diff --git a/.gitignore b/.gitignore new file mode 100644 index 0000000..f4003f4 --- /dev/null +++ b/.gitignore @@ -0,0 +1,16 @@ +#ignore .Rhistory +.Rhistory +data_download_time.Rda + +#ignore python files +figures_py/ +COVID.py + +#ignore all the data files +data/* + +#ignore the figure files +figures/* + +#except the population one +!data/co-est2020-alldata.csv diff --git a/COVID.R b/COVID.R new file mode 100644 index 0000000..a95a651 --- /dev/null +++ b/COVID.R @@ -0,0 +1,497 @@ +starttime <- Sys.time() +#setup ---- +library(tidyverse) +library(lubridate) +library(ggmap) +library(ggrepel) + +setwd(paste0("~/", + ifelse(Sys.info()['nodename'] == "pseudotsuga", "Documents", "Nextcloud"), + "/dataProjects/COVID")) + +#download data ---- +load("data_download_time.Rda") + +if(as.double(difftime(downloaded_dttm, Sys.time()), units = "hours") < -2){ + + print("Downloading today's data") + + us_county_data <- read_csv("https://raw.githubusercontent.com/nytimes/covid-19-data/master/us-counties.csv") + save(us_county_data, file = 'data/us_county_data.Rda') + + downloaded_dttm <- Sys.time() + save(downloaded_dttm, file = "data_download_time.Rda") + +} else { + print("data is current") + load('data/us_county_data.Rda') +} + +##to redownload data, uncomment the following 2 lines +#downloaded_dttm <- downloaded_dttm - days(1) +#save(downloaded_dttm, file = "data_download_time.Rda") + +#us_county_data <- read.csv("data/us-counties.csv") +#cleanup data ---- +#make dates in a date format +us_county_data <- us_county_data %>% + mutate(date = ymd(date)) %>% + mutate(week = floor_date(date, "weeks", week_start = 1)) + +maxdate <- max(us_county_data$date) + +#load county pop data +us_county_pop <- read.csv("data/co-est2020-alldata.csv") + +us_county_pop <- us_county_pop %>% + mutate(state = STNAME, + county = ifelse(state != "Louisiana", sub(" County.*", "", CTYNAME), sub(" Parish.*", "", CTYNAME))) %>% + mutate(county_state = paste0(county, ", ", state)) + +us_county_data["countypop"] <- us_county_pop[match(paste0(us_county_data$county, ", ", us_county_data$state), us_county_pop$county_state), 13] + +us_county_data <- us_county_data %>% + group_by(state, county) %>% + arrange(date) %>% + mutate(county_state = paste0(county,", ", state), + newcases = cases - lag(cases, n = 1, default = 0), + twowkcases = cases - lag(cases, n = 14, default = 0)) %>% + mutate(active_estimate = twowkcases/countypop * 100000) + + +important_counties <- list(washington = c("Clallam", + "Jefferson", + "Kitsap", + "King"), + wisconsin = c("Milwaukee", + "Dane", + "Vilas", + "Brown", + "Door"), + illinois = c("Cook")) + +noted_dates_wa<- data.frame(event = c("Stay-at-home begins", "Phase 1 reopening", "Phase 2 reopening"), + eventdate <- c(ymd("2020-03-23"), ymd("2020-04-29"), ymd("2020-06-01"))) + + +us_county_map <- map_data("county") +us_county_map["county_state"] <- paste0(us_county_map$subregion, ", ", us_county_map$region) + +us_county_map <- merge(us_county_map, + us_county_data %>% + filter(date %in% maxdate) %>% + mutate(county_state = tolower(county_state)), + by.x = "county_state", + by.y = "county_state", + all = TRUE) + +us_county_label <- us_county_map %>% + group_by(state, county) %>% + summarise(long = (max(long)+min(long))/2, lat = (max(lat)+min(lat))/2) %>% + ungroup() + +#Washington plots ---- +#graph nearby active cases +ggplot(data = us_county_data %>% filter(state %in% "Washington", + county %in% important_counties$washington)) + + geom_line(aes(x = date, + y = twowkcases/countypop * 100000, + color = county, + alpha = ifelse(county == "Clallam", 1, 1)), + size = 0.5) + + geom_label(data = us_county_data %>% filter(state %in% "Washington", + county %in% important_counties$washington, + date %in% max(date)), + aes(x = date + 1, + y = twowkcases/countypop * 100000, + label = paste0(county,' - ', round(active_estimate,0)), + fill = county), + hjust = "outward", + size = 2.5) + + scale_color_brewer(palette = "Set2") + + scale_fill_brewer(palette = "Set2", guide = "none") + + scale_alpha_continuous(limits = c(0, 1), guide = "none") + + scale_x_date(date_breaks = "1 month", date_labels = "%b\n%Y", minor_breaks = "1 week", expand = expansion(mult = c(0.01, 0.07))) + + scale_y_continuous(expand = expansion(mult = c(0,0.1))) + + labs(title = "Case rate - nearby counties", + subtitle = paste("Through", format(downloaded_dttm, "%B %e, %Y")), + x = "Date", + color = NULL, + y = "new cases in previous 14 days per 100,000 people", + caption = "data from The New York Times") + + theme_bw() + + theme(panel.grid.major.x = element_line(colour="black", size = 0.1), + axis.text.x = element_text(angle = 60, hjust = 1), + plot.subtitle = element_text(color = "grey50"), + plot.caption = element_text(color = "grey50"), + legend.position = "bottom") + + coord_cartesian(ylim = c(0,NA), + clip = "off") +ggsave(filename = "nearby_caserate.png" , + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + width = 11, + height = 8.5, + units = "in") + +#plot new cases per week +ggplot() + + facet_grid(county ~ .) + + geom_col(data = us_county_data %>% filter(state %in% "Washington", + county %in% important_counties$washington, + county != "King"), + aes(x = week, + y = newcases, + fill = county), + position = "dodge") + + theme_bw() + + scale_fill_brewer(palette = "Set2") + + scale_x_date(date_breaks = "1 week", date_labels = "%b %e", expand = expansion(add = c(7,0), mult = 0)) + + scale_y_continuous(limits = c(0,NA), expand = expansion(mult = c(0,0.1))) + + theme(panel.grid.minor.x = element_blank(), axis.text.x = element_text(angle = 60, hjust = 1)) + + labs(title = "New cases of COVID-19 per week", + subtitle = paste("through", format(maxdate, "%b %e")), + x = "Week of", + y = "Number of new cases") +ggsave(filename = "pen_new_per_week.png" , + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + width = 11, + height = 8.5, + units = "in") + +#plot new cases per week per 100000 people +ggplot() + + facet_grid(county ~ .) + + geom_col(data = us_county_data %>% filter(state %in% "Washington", + county %in% important_counties$washington, + county != "King"), + aes(x = week, + y = newcases/countypop, + fill = county), + position = "dodge") + + theme_bw() + + scale_fill_brewer(palette = "Set2") + + scale_x_date(date_breaks = "1 week", date_labels = "%b %e", expand = expansion(add = c(7,0), mult = 0)) + + scale_y_continuous(limits = c(0,NA), expand = expansion(mult = c(0,0.1))) + + theme(panel.grid.minor.x = element_blank(), axis.text.x = element_text(angle = 60, hjust = 1)) + + labs(title = "New cases of COVID-19 per week - population normalized", + subtitle = paste("through", format(maxdate, "%b %e")), + x = "Week of", + y = "Number of new cases per 100,000 people") +ggsave(filename = "pen_new_per_week_popnorm.png" , + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + width = 11, + height = 8.5, + units = "in") + + +#all WA counties new cases per 100000 +ggplot() + + facet_wrap(county ~ .) + + geom_rect(data = us_county_data %>% + filter(state %in% "Washington", + !county %in% important_counties$washington), + aes(xmin = ymd("2020-01-01"), + xmax = maxdate + 30, + ymin = -100, + ymax = 10000), + fill = '#f2f2f2', + alpha = 0.1) + + geom_line(data = us_county_data %>% + filter(state %in% "Washington"), + aes(x = date, + y = active_estimate, + color = active_estimate), + size = 1) + + geom_line(data = us_county_data %>% filter(state %in% "Washington"), + aes(x = date, + y = active_estimate), + color = "Black", + size = 0.1) + + theme_bw() + + scale_x_date(date_breaks = "1 month", date_labels = "%b") + + scale_color_distiller(palette = "YlOrRd", direction = 1, guide = "none") + + theme(panel.grid.minor.x = element_blank(), + axis.text.x = element_text(angle = 60, hjust = 1), + legend.position="bottom", + strip.text = element_text(size = 10), + panel.spacing = unit(0.1, "lines")) + + coord_cartesian(xlim = c(min(us_county_data %>% filter(state %in% "Washington") %>% pull(date), na.rm = TRUE), maxdate), + ylim = c(0, max(us_county_data %>% filter(state %in% "Washington") %>% pull(active_estimate), na.rm = TRUE))) + + labs(title = "Estimate of active cases by county", + subtitle = paste("through", format(maxdate, "%b %e")), + x = NULL, + y = "New cases per 100,000 people in previous two weeks") +ggsave(filename = "WA_new_week_person.png" , + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + height = 8.5, + width = 11, + units = "in") + + +#new cases in the last two weeks +ggplot() + + geom_col(data = us_county_data %>% + filter(state %in% "Washington", + date == maxdate) %>% + mutate(peninsula = ifelse(county %in% important_counties$washington, T, F)), + aes(x = reorder(county, active_estimate), + y = active_estimate, + fill = peninsula)) + + scale_fill_manual(values = c('#595959', 'darkgreen'), guide = NULL) + + theme(axis.text.x = element_text(angle = 60, hjust = 1)) + + scale_y_continuous(limits = c(0, NA)) + + labs(title = "Cumulative new cases in the last two weeks", + subtitle = paste(Sys.Date()-days(14), "-", Sys.Date()), + x = "County", + y = "Cumulative new cases in the last two weeks (per 100,000 residents)") +ggsave(filename = "WA_new_twoweek_column.png" , + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + height = 8.5, + width = 11, + units = "in") + + +#map latest cases +#make bounding box for maps + +buffer <- 0.1 +states <- c("Washington", "Wisconsin", "Illinois") +max_county_value <- max(us_county_data %>% filter(state %in% states) %>% pull(active_estimate), na.rm = TRUE) + +#this if statement loads new basemap tiles only if marked as "TRUE", otherwise it loads the tiles from the file: /data/basemap.RData + +for(i in 1:length(states)){ + if(FALSE){ + range <- c(left = min(us_county_map %>% filter(state %in% states[i]) %>% pull(long), na.rm = TRUE) - buffer, + bottom = min(us_county_map %>% filter(state %in% states[i]) %>% pull(lat), na.rm = TRUE) - buffer, + right = max(us_county_map %>% filter(state %in% states[i]) %>% pull(long), na.rm = TRUE) + buffer, + top = max(us_county_map %>% filter(state %in% states[i]) %>% pull(lat), na.rm = TRUE) + buffer) + + basemap <- ggmap::get_stamenmap(bbox = range, + zoom = 8, + maptype = "toner-hybrid") + save(basemap, file = paste0("data/", states[i], "_basemap.RData")) + } else { + load(file = paste0("data/", states[i], "_basemap.RData")) + } + + ggmap(basemap) + + geom_polygon(data = us_county_map %>% filter(state %in% states[i]) %>% arrange(order), + aes(x = long, + y = lat, + group = group, + fill = active_estimate), + colour = "grey50", + alpha = 0.5) + + geom_text(data= us_county_label %>% filter(state %in% states[i]), + aes(x = long, + y = lat, + label = str_to_title(county)), + size = 2)+ + scale_fill_distiller(palette = "Spectral") + + theme_bw() + + scale_x_continuous(breaks = NULL) + + scale_y_continuous(breaks = NULL) + + theme(panel.grid.minor = element_blank(), panel.grid.major = element_blank(), + plot.subtitle = element_text(color = "grey50"), + plot.caption = element_text(color = "grey50"), + legend.position = "bottom", + legend.text = element_text(angle = 60, hjust = 1)) + + labs(title = "Cumulative new cases in the last two weeks", + subtitle = format(downloaded_dttm, "%B %e"), + x = NULL, + y = NULL, + fill = "Cumulative new cases per\n100,000 residents") + ggsave(filename = paste0("map_active_", tolower(substr(states[i], 1, 2)), ".png"), + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + width = 11, + height = 8.5, + units = "in") + +} + +ggplot() + + geom_polygon(data = us_county_map %>% + mutate(active_estimate = ifelse(active_estimate < 0, 0, active_estimate)) %>% + arrange(order), + aes(x = long, + y = lat, + group = group, + fill = active_estimate), + colour = NA) + + scale_fill_gradientn(colors = rev(RColorBrewer::brewer.pal(n = 9, name = "Spectral")), trans = "log10") + + theme_bw() + + scale_x_continuous(breaks = NULL) + + scale_y_continuous(breaks = NULL) + + theme(panel.grid.minor = element_blank(), panel.grid.major = element_blank(), + plot.subtitle = element_text(color = "grey50"), + plot.caption = element_text(color = "grey50"), + legend.position = "bottom", + legend.text = element_text(angle = 60, hjust = 1)) + + labs(title = "Cumulative new cases in the last two weeks", + subtitle = format(downloaded_dttm, "%B %e"), + x = NULL, + y = NULL, + fill = "Cumulative new cases per\n100,000 residents") +ggsave(filename = "map_active_us.png", + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + width = 11, + height = 8.5, + units = "in") + +# WI data ---- +#Milwaukee county plots +# add dates + +noted_dates_wi<- data.frame(event = c("Stay-at-home order", "Restrictions lifted"), + eventdate = c(ymd("2020-03-25"), ymd("2020-05-14"))) + + +# WI plots ---- +#graph active cases for select counties +ggplot(us_county_data %>% filter(state %in% "Wisconsin", + county %in% important_counties$wisconsin)) + + geom_line(data = us_county_data %>% filter(state %in% "Washington", + county %in% c("Clallam", "King")), + aes(x = date, + y = active_estimate, + group = county), + color = "grey", + alpha = 0.5) + + geom_line(aes(x = date, + y = active_estimate, + color = county), + size = 0.75) + + geom_label_repel(data = us_county_data %>% filter(state %in% "Washington", + county %in% c("Clallam", "King"), + date %in% max(date)), + aes(x = date + 1, + y = active_estimate, + label = county), + hjust = "outward", + direction = "y", + size = 2.5, + color = "grey",) + + geom_label_repel(data = us_county_data %>% filter(state %in% "Wisconsin", + county %in% important_counties$wisconsin, + date %in% max(date)), + aes(x = date + 1, + y = active_estimate, + label = paste0(county,' - ', round(active_estimate,0)), + fill = county), + hjust = "outward", + direction = "y", + size = 2.5, + nudge_x = 4, + segment.color = "black", + segment.size = 0.3) + + scale_color_brewer(palette = "Set2", guide = "none") + + scale_fill_brewer(palette = "Set2", guide = "none") + + scale_x_date(date_breaks = "1 month", + date_labels = "%b\n%Y", + minor_breaks = "1 week", + expand = expansion(mult = c(0.02, 0.1))) + + scale_y_continuous(expand = expansion(mult = c(0,0.1))) + + labs(title = "Active case estimate - Wisconsin counties", + subtitle = paste("Through", format(downloaded_dttm, "%B %e")), + x = "Date", + y = "new cases in previous 14 days per 100,000 people", + color = "County") + + theme_bw() + + theme(panel.grid.major.x = element_line(colour="black", size = 0.1), axis.text.x = element_text(angle = 60, hjust = 1)) + + coord_cartesian(ylim = c(0,NA)) +ggsave(filename = "WI_active_cases.png" , + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + width = 11, + height = 8.5, + units = "in") + +ggplot() + + geom_line(data = us_county_data %>% + filter(county_state %in% c("Clallam, Washington", "Cook, Illinois", "Milwaukee, Wisconsin", "Dane, Wisconsin", "Alameda, California", 'Salt Lake, Utah')), + aes(x = date, + y = active_estimate, + color = county)) + + geom_label_repel(data = us_county_data %>% + filter(county_state %in% c("Clallam, Washington", "Cook, Illinois", "Milwaukee, Wisconsin", "Dane, Wisconsin", "Alameda, California", 'Salt Lake, Utah'), + date %in% maxdate), + aes(x = date + 0.5, + y = active_estimate, + label = paste0(county,' - ', round(active_estimate,0)), + fill = county), + hjust = "outward", + direction = "y", + size = 2.5, + nudge_x = 4, + box.padding = 0.01, + min.segment.length = 0, + segment.color = "black", + segment.size = 0.1) + + scale_color_brewer(palette = "Set2", guide = "none") + + scale_fill_brewer(palette = "Set2", guide = "none") + + scale_x_date(date_breaks = "1 month", + date_labels = "%b\n%Y", + minor_breaks = "1 week", + expand = expansion(mult = c(0.01, .07))) + + scale_y_continuous(expand = expansion(mult = c(0,0.1))) + + labs(title = "Active case estimate", + subtitle = paste("Through", format(downloaded_dttm, "%B %e")), + x = "Date", + y = "new cases in previous 14 days per 100,000 people", + color = "County", + caption = "data from The New York Times") + + theme_bw() + + theme(panel.grid.major.x = element_line(colour="black", size = 0.1), + axis.text.x = element_text(angle = 60, hjust = 1), + plot.subtitle = element_text(color = "grey50"), + plot.caption = element_text(color = "grey50")) + + coord_cartesian(ylim = c(0,NA)) +ggsave(filename = "Important_active_cases.png" , + path = paste(getwd(),"/figures/", sep = ""), + device = "png", + width = 11, + height = 8.5, + units = "in") + +# Animation #### +if(FALSE){ + + library(gganimate) + + anim <- ggplot(data = us_county_data %>% filter(state %in% "Washington"), + aes(x = active_estimate, + y = deaths/countypop * 100000)) + + geom_point(aes(size = countypop, + color = active_estimate)) + + scale_color_distiller(palette = "Spectral") + + labs(title = "Cases and deaths by county in WA", + subtitle = "Date: {frame_time}", + x = "Cases per 100,000 residents", + y = "Deaths per 100,000 residents", + color = "active case estimate", + size = "population") + + transition_time(date) + + ease_aes('linear') + + animate(anim, + nframes = as.double(difftime(maxdate, ymd("2020_01_21"), units = "days"))) + + anim_save(filename = "WA_cases_county.gif", + animation = last_animation(), + path = paste(getwd(),"/figures/", sep = ""), + fps = 1, + loop = 0,) +} else { + message("no animation this time") +} + +message(difftime(Sys.time(), starttime)) +rm(starttime) diff --git a/LICENSE b/LICENSE deleted file mode 100644 index d41c0bd..0000000 --- a/LICENSE +++ /dev/null @@ -1,232 +0,0 @@ -GNU GENERAL PUBLIC LICENSE -Version 3, 29 June 2007 - -Copyright © 2007 Free Software Foundation, Inc. - -Everyone is permitted to copy and distribute verbatim copies of this license document, but changing it is not allowed. - -Preamble - -The GNU General Public License is a free, copyleft license for software and other kinds of works. - -The licenses for most software and other practical works are designed to take away your freedom to share and change the works. By contrast, the GNU General Public License is intended to guarantee your freedom to share and change all versions of a program--to make sure it remains free software for all its users. We, the Free Software Foundation, use the GNU General Public License for most of our software; it applies also to any other work released this way by its authors. You can apply it to your programs, too. - -When we speak of free software, we are referring to freedom, not price. Our General Public Licenses are designed to make sure that you have the freedom to distribute copies of free software (and charge for them if you wish), that you receive source code or can get it if you want it, that you can change the software or use pieces of it in new free programs, and that you know you can do these things. - -To protect your rights, we need to prevent others from denying you these rights or asking you to surrender the rights. Therefore, you have certain responsibilities if you distribute copies of the software, or if you modify it: responsibilities to respect the freedom of others. - -For example, if you distribute copies of such a program, whether gratis or for a fee, you must pass on to the recipients the same freedoms that you received. You must make sure that they, too, receive or can get the source code. And you must show them these terms so they know their rights. - -Developers that use the GNU GPL protect your rights with two steps: (1) assert copyright on the software, and (2) offer you this License giving you legal permission to copy, distribute and/or modify it. - -For the developers' and authors' protection, the GPL clearly explains that there is no warranty for this free software. For both users' and authors' sake, the GPL requires that modified versions be marked as changed, so that their problems will not be attributed erroneously to authors of previous versions. - -Some devices are designed to deny users access to install or run modified versions of the software inside them, although the manufacturer can do so. This is fundamentally incompatible with the aim of protecting users' freedom to change the software. The systematic pattern of such abuse occurs in the area of products for individuals to use, which is precisely where it is most unacceptable. Therefore, we have designed this version of the GPL to prohibit the practice for those products. If such problems arise substantially in other domains, we stand ready to extend this provision to those domains in future versions of the GPL, as needed to protect the freedom of users. - -Finally, every program is threatened constantly by software patents. States should not allow patents to restrict development and use of software on general-purpose computers, but in those that do, we wish to avoid the special danger that patents applied to a free program could make it effectively proprietary. To prevent this, the GPL assures that patents cannot be used to render the program non-free. - -The precise terms and conditions for copying, distribution and modification follow. - -TERMS AND CONDITIONS - -0. Definitions. - -“This License” refers to version 3 of the GNU General Public License. - -“Copyright” also means copyright-like laws that apply to other kinds of works, such as semiconductor masks. - -“The Program” refers to any copyrightable work licensed under this License. Each licensee is addressed as “you”. “Licensees” and “recipients” may be individuals or organizations. - -To “modify” a work means to copy from or adapt all or part of the work in a fashion requiring copyright permission, other than the making of an exact copy. The resulting work is called a “modified version” of the earlier work or a work “based on” the earlier work. - -A “covered work” means either the unmodified Program or a work based on the Program. - -To “propagate” a work means to do anything with it that, without permission, would make you directly or secondarily liable for infringement under applicable copyright law, except executing it on a computer or modifying a private copy. Propagation includes copying, distribution (with or without modification), making available to the public, and in some countries other activities as well. - -To “convey” a work means any kind of propagation that enables other parties to make or receive copies. Mere interaction with a user through a computer network, with no transfer of a copy, is not conveying. - -An interactive user interface displays “Appropriate Legal Notices” to the extent that it includes a convenient and prominently visible feature that (1) displays an appropriate copyright notice, and (2) tells the user that there is no warranty for the work (except to the extent that warranties are provided), that licensees may convey the work under this License, and how to view a copy of this License. If the interface presents a list of user commands or options, such as a menu, a prominent item in the list meets this criterion. - -1. Source Code. -The “source code” for a work means the preferred form of the work for making modifications to it. “Object code” means any non-source form of a work. - -A “Standard Interface” means an interface that either is an official standard defined by a recognized standards body, or, in the case of interfaces specified for a particular programming language, one that is widely used among developers working in that language. - -The “System Libraries” of an executable work include anything, other than the work as a whole, that (a) is included in the normal form of packaging a Major Component, but which is not part of that Major Component, and (b) serves only to enable use of the work with that Major Component, or to implement a Standard Interface for which an implementation is available to the public in source code form. A “Major Component”, in this context, means a major essential component (kernel, window system, and so on) of the specific operating system (if any) on which the executable work runs, or a compiler used to produce the work, or an object code interpreter used to run it. - -The “Corresponding Source” for a work in object code form means all the source code needed to generate, install, and (for an executable work) run the object code and to modify the work, including scripts to control those activities. However, it does not include the work's System Libraries, or general-purpose tools or generally available free programs which are used unmodified in performing those activities but which are not part of the work. For example, Corresponding Source includes interface definition files associated with source files for the work, and the source code for shared libraries and dynamically linked subprograms that the work is specifically designed to require, such as by intimate data communication or control flow between those subprograms and other parts of the work. - -The Corresponding Source need not include anything that users can regenerate automatically from other parts of the Corresponding Source. - -The Corresponding Source for a work in source code form is that same work. - -2. Basic Permissions. -All rights granted under this License are granted for the term of copyright on the Program, and are irrevocable provided the stated conditions are met. This License explicitly affirms your unlimited permission to run the unmodified Program. The output from running a covered work is covered by this License only if the output, given its content, constitutes a covered work. This License acknowledges your rights of fair use or other equivalent, as provided by copyright law. - -You may make, run and propagate covered works that you do not convey, without conditions so long as your license otherwise remains in force. You may convey covered works to others for the sole purpose of having them make modifications exclusively for you, or provide you with facilities for running those works, provided that you comply with the terms of this License in conveying all material for which you do not control copyright. Those thus making or running the covered works for you must do so exclusively on your behalf, under your direction and control, on terms that prohibit them from making any copies of your copyrighted material outside their relationship with you. - -Conveying under any other circumstances is permitted solely under the conditions stated below. Sublicensing is not allowed; section 10 makes it unnecessary. - -3. Protecting Users' Legal Rights From Anti-Circumvention Law. -No covered work shall be deemed part of an effective technological measure under any applicable law fulfilling obligations under article 11 of the WIPO copyright treaty adopted on 20 December 1996, or similar laws prohibiting or restricting circumvention of such measures. - -When you convey a covered work, you waive any legal power to forbid circumvention of technological measures to the extent such circumvention is effected by exercising rights under this License with respect to the covered work, and you disclaim any intention to limit operation or modification of the work as a means of enforcing, against the work's users, your or third parties' legal rights to forbid circumvention of technological measures. - -4. Conveying Verbatim Copies. -You may convey verbatim copies of the Program's source code as you receive it, in any medium, provided that you conspicuously and appropriately publish on each copy an appropriate copyright notice; keep intact all notices stating that this License and any non-permissive terms added in accord with section 7 apply to the code; keep intact all notices of the absence of any warranty; and give all recipients a copy of this License along with the Program. - -You may charge any price or no price for each copy that you convey, and you may offer support or warranty protection for a fee. - -5. Conveying Modified Source Versions. -You may convey a work based on the Program, or the modifications to produce it from the Program, in the form of source code under the terms of section 4, provided that you also meet all of these conditions: - - a) The work must carry prominent notices stating that you modified it, and giving a relevant date. - - b) The work must carry prominent notices stating that it is released under this License and any conditions added under section 7. This requirement modifies the requirement in section 4 to “keep intact all notices”. - - c) You must license the entire work, as a whole, under this License to anyone who comes into possession of a copy. This License will therefore apply, along with any applicable section 7 additional terms, to the whole of the work, and all its parts, regardless of how they are packaged. This License gives no permission to license the work in any other way, but it does not invalidate such permission if you have separately received it. - - d) If the work has interactive user interfaces, each must display Appropriate Legal Notices; however, if the Program has interactive interfaces that do not display Appropriate Legal Notices, your work need not make them do so. - -A compilation of a covered work with other separate and independent works, which are not by their nature extensions of the covered work, and which are not combined with it such as to form a larger program, in or on a volume of a storage or distribution medium, is called an “aggregate” if the compilation and its resulting copyright are not used to limit the access or legal rights of the compilation's users beyond what the individual works permit. Inclusion of a covered work in an aggregate does not cause this License to apply to the other parts of the aggregate. - -6. Conveying Non-Source Forms. -You may convey a covered work in object code form under the terms of sections 4 and 5, provided that you also convey the machine-readable Corresponding Source under the terms of this License, in one of these ways: - - a) Convey the object code in, or embodied in, a physical product (including a physical distribution medium), accompanied by the Corresponding Source fixed on a durable physical medium customarily used for software interchange. - - b) Convey the object code in, or embodied in, a physical product (including a physical distribution medium), accompanied by a written offer, valid for at least three years and valid for as long as you offer spare parts or customer support for that product model, to give anyone who possesses the object code either (1) a copy of the Corresponding Source for all the software in the product that is covered by this License, on a durable physical medium customarily used for software interchange, for a price no more than your reasonable cost of physically performing this conveying of source, or (2) access to copy the Corresponding Source from a network server at no charge. - - c) Convey individual copies of the object code with a copy of the written offer to provide the Corresponding Source. This alternative is allowed only occasionally and noncommercially, and only if you received the object code with such an offer, in accord with subsection 6b. - - d) Convey the object code by offering access from a designated place (gratis or for a charge), and offer equivalent access to the Corresponding Source in the same way through the same place at no further charge. You need not require recipients to copy the Corresponding Source along with the object code. If the place to copy the object code is a network server, the Corresponding Source may be on a different server (operated by you or a third party) that supports equivalent copying facilities, provided you maintain clear directions next to the object code saying where to find the Corresponding Source. Regardless of what server hosts the Corresponding Source, you remain obligated to ensure that it is available for as long as needed to satisfy these requirements. - - e) Convey the object code using peer-to-peer transmission, provided you inform other peers where the object code and Corresponding Source of the work are being offered to the general public at no charge under subsection 6d. - -A separable portion of the object code, whose source code is excluded from the Corresponding Source as a System Library, need not be included in conveying the object code work. - -A “User Product” is either (1) a “consumer product”, which means any tangible personal property which is normally used for personal, family, or household purposes, or (2) anything designed or sold for incorporation into a dwelling. In determining whether a product is a consumer product, doubtful cases shall be resolved in favor of coverage. For a particular product received by a particular user, “normally used” refers to a typical or common use of that class of product, regardless of the status of the particular user or of the way in which the particular user actually uses, or expects or is expected to use, the product. A product is a consumer product regardless of whether the product has substantial commercial, industrial or non-consumer uses, unless such uses represent the only significant mode of use of the product. - -“Installation Information” for a User Product means any methods, procedures, authorization keys, or other information required to install and execute modified versions of a covered work in that User Product from a modified version of its Corresponding Source. The information must suffice to ensure that the continued functioning of the modified object code is in no case prevented or interfered with solely because modification has been made. - -If you convey an object code work under this section in, or with, or specifically for use in, a User Product, and the conveying occurs as part of a transaction in which the right of possession and use of the User Product is transferred to the recipient in perpetuity or for a fixed term (regardless of how the transaction is characterized), the Corresponding Source conveyed under this section must be accompanied by the Installation Information. But this requirement does not apply if neither you nor any third party retains the ability to install modified object code on the User Product (for example, the work has been installed in ROM). - -The requirement to provide Installation Information does not include a requirement to continue to provide support service, warranty, or updates for a work that has been modified or installed by the recipient, or for the User Product in which it has been modified or installed. Access to a network may be denied when the modification itself materially and adversely affects the operation of the network or violates the rules and protocols for communication across the network. - -Corresponding Source conveyed, and Installation Information provided, in accord with this section must be in a format that is publicly documented (and with an implementation available to the public in source code form), and must require no special password or key for unpacking, reading or copying. - -7. Additional Terms. -“Additional permissions” are terms that supplement the terms of this License by making exceptions from one or more of its conditions. Additional permissions that are applicable to the entire Program shall be treated as though they were included in this License, to the extent that they are valid under applicable law. If additional permissions apply only to part of the Program, that part may be used separately under those permissions, but the entire Program remains governed by this License without regard to the additional permissions. - -When you convey a copy of a covered work, you may at your option remove any additional permissions from that copy, or from any part of it. (Additional permissions may be written to require their own removal in certain cases when you modify the work.) You may place additional permissions on material, added by you to a covered work, for which you have or can give appropriate copyright permission. - -Notwithstanding any other provision of this License, for material you add to a covered work, you may (if authorized by the copyright holders of that material) supplement the terms of this License with terms: - - a) Disclaiming warranty or limiting liability differently from the terms of sections 15 and 16 of this License; or - - b) Requiring preservation of specified reasonable legal notices or author attributions in that material or in the Appropriate Legal Notices displayed by works containing it; or - - c) Prohibiting misrepresentation of the origin of that material, or requiring that modified versions of such material be marked in reasonable ways as different from the original version; or - - d) Limiting the use for publicity purposes of names of licensors or authors of the material; or - - e) Declining to grant rights under trademark law for use of some trade names, trademarks, or service marks; or - - f) Requiring indemnification of licensors and authors of that material by anyone who conveys the material (or modified versions of it) with contractual assumptions of liability to the recipient, for any liability that these contractual assumptions directly impose on those licensors and authors. - -All other non-permissive additional terms are considered “further restrictions” within the meaning of section 10. If the Program as you received it, or any part of it, contains a notice stating that it is governed by this License along with a term that is a further restriction, you may remove that term. If a license document contains a further restriction but permits relicensing or conveying under this License, you may add to a covered work material governed by the terms of that license document, provided that the further restriction does not survive such relicensing or conveying. - -If you add terms to a covered work in accord with this section, you must place, in the relevant source files, a statement of the additional terms that apply to those files, or a notice indicating where to find the applicable terms. - -Additional terms, permissive or non-permissive, may be stated in the form of a separately written license, or stated as exceptions; the above requirements apply either way. - -8. Termination. -You may not propagate or modify a covered work except as expressly provided under this License. Any attempt otherwise to propagate or modify it is void, and will automatically terminate your rights under this License (including any patent licenses granted under the third paragraph of section 11). - -However, if you cease all violation of this License, then your license from a particular copyright holder is reinstated (a) provisionally, unless and until the copyright holder explicitly and finally terminates your license, and (b) permanently, if the copyright holder fails to notify you of the violation by some reasonable means prior to 60 days after the cessation. - -Moreover, your license from a particular copyright holder is reinstated permanently if the copyright holder notifies you of the violation by some reasonable means, this is the first time you have received notice of violation of this License (for any work) from that copyright holder, and you cure the violation prior to 30 days after your receipt of the notice. - -Termination of your rights under this section does not terminate the licenses of parties who have received copies or rights from you under this License. If your rights have been terminated and not permanently reinstated, you do not qualify to receive new licenses for the same material under section 10. - -9. Acceptance Not Required for Having Copies. -You are not required to accept this License in order to receive or run a copy of the Program. Ancillary propagation of a covered work occurring solely as a consequence of using peer-to-peer transmission to receive a copy likewise does not require acceptance. However, nothing other than this License grants you permission to propagate or modify any covered work. These actions infringe copyright if you do not accept this License. Therefore, by modifying or propagating a covered work, you indicate your acceptance of this License to do so. - -10. Automatic Licensing of Downstream Recipients. -Each time you convey a covered work, the recipient automatically receives a license from the original licensors, to run, modify and propagate that work, subject to this License. You are not responsible for enforcing compliance by third parties with this License. - -An “entity transaction” is a transaction transferring control of an organization, or substantially all assets of one, or subdividing an organization, or merging organizations. If propagation of a covered work results from an entity transaction, each party to that transaction who receives a copy of the work also receives whatever licenses to the work the party's predecessor in interest had or could give under the previous paragraph, plus a right to possession of the Corresponding Source of the work from the predecessor in interest, if the predecessor has it or can get it with reasonable efforts. - -You may not impose any further restrictions on the exercise of the rights granted or affirmed under this License. For example, you may not impose a license fee, royalty, or other charge for exercise of rights granted under this License, and you may not initiate litigation (including a cross-claim or counterclaim in a lawsuit) alleging that any patent claim is infringed by making, using, selling, offering for sale, or importing the Program or any portion of it. - -11. Patents. -A “contributor” is a copyright holder who authorizes use under this License of the Program or a work on which the Program is based. The work thus licensed is called the contributor's “contributor version”. - -A contributor's “essential patent claims” are all patent claims owned or controlled by the contributor, whether already acquired or hereafter acquired, that would be infringed by some manner, permitted by this License, of making, using, or selling its contributor version, but do not include claims that would be infringed only as a consequence of further modification of the contributor version. For purposes of this definition, “control” includes the right to grant patent sublicenses in a manner consistent with the requirements of this License. - -Each contributor grants you a non-exclusive, worldwide, royalty-free patent license under the contributor's essential patent claims, to make, use, sell, offer for sale, import and otherwise run, modify and propagate the contents of its contributor version. - -In the following three paragraphs, a “patent license” is any express agreement or commitment, however denominated, not to enforce a patent (such as an express permission to practice a patent or covenant not to sue for patent infringement). To “grant” such a patent license to a party means to make such an agreement or commitment not to enforce a patent against the party. - -If you convey a covered work, knowingly relying on a patent license, and the Corresponding Source of the work is not available for anyone to copy, free of charge and under the terms of this License, through a publicly available network server or other readily accessible means, then you must either (1) cause the Corresponding Source to be so available, or (2) arrange to deprive yourself of the benefit of the patent license for this particular work, or (3) arrange, in a manner consistent with the requirements of this License, to extend the patent license to downstream recipients. “Knowingly relying” means you have actual knowledge that, but for the patent license, your conveying the covered work in a country, or your recipient's use of the covered work in a country, would infringe one or more identifiable patents in that country that you have reason to believe are valid. - -If, pursuant to or in connection with a single transaction or arrangement, you convey, or propagate by procuring conveyance of, a covered work, and grant a patent license to some of the parties receiving the covered work authorizing them to use, propagate, modify or convey a specific copy of the covered work, then the patent license you grant is automatically extended to all recipients of the covered work and works based on it. - -A patent license is “discriminatory” if it does not include within the scope of its coverage, prohibits the exercise of, or is conditioned on the non-exercise of one or more of the rights that are specifically granted under this License. You may not convey a covered work if you are a party to an arrangement with a third party that is in the business of distributing software, under which you make payment to the third party based on the extent of your activity of conveying the work, and under which the third party grants, to any of the parties who would receive the covered work from you, a discriminatory patent license (a) in connection with copies of the covered work conveyed by you (or copies made from those copies), or (b) primarily for and in connection with specific products or compilations that contain the covered work, unless you entered into that arrangement, or that patent license was granted, prior to 28 March 2007. - -Nothing in this License shall be construed as excluding or limiting any implied license or other defenses to infringement that may otherwise be available to you under applicable patent law. - -12. No Surrender of Others' Freedom. -If conditions are imposed on you (whether by court order, agreement or otherwise) that contradict the conditions of this License, they do not excuse you from the conditions of this License. If you cannot convey a covered work so as to satisfy simultaneously your obligations under this License and any other pertinent obligations, then as a consequence you may not convey it at all. For example, if you agree to terms that obligate you to collect a royalty for further conveying from those to whom you convey the Program, the only way you could satisfy both those terms and this License would be to refrain entirely from conveying the Program. - -13. Use with the GNU Affero General Public License. -Notwithstanding any other provision of this License, you have permission to link or combine any covered work with a work licensed under version 3 of the GNU Affero General Public License into a single combined work, and to convey the resulting work. The terms of this License will continue to apply to the part which is the covered work, but the special requirements of the GNU Affero General Public License, section 13, concerning interaction through a network will apply to the combination as such. - -14. Revised Versions of this License. -The Free Software Foundation may publish revised and/or new versions of the GNU General Public License from time to time. Such new versions will be similar in spirit to the present version, but may differ in detail to address new problems or concerns. - -Each version is given a distinguishing version number. If the Program specifies that a certain numbered version of the GNU General Public License “or any later version” applies to it, you have the option of following the terms and conditions either of that numbered version or of any later version published by the Free Software Foundation. If the Program does not specify a version number of the GNU General Public License, you may choose any version ever published by the Free Software Foundation. - -If the Program specifies that a proxy can decide which future versions of the GNU General Public License can be used, that proxy's public statement of acceptance of a version permanently authorizes you to choose that version for the Program. - -Later license versions may give you additional or different permissions. However, no additional obligations are imposed on any author or copyright holder as a result of your choosing to follow a later version. - -15. Disclaimer of Warranty. -THERE IS NO WARRANTY FOR THE PROGRAM, TO THE EXTENT PERMITTED BY APPLICABLE LAW. EXCEPT WHEN OTHERWISE STATED IN WRITING THE COPYRIGHT HOLDERS AND/OR OTHER PARTIES PROVIDE THE PROGRAM “AS IS” WITHOUT WARRANTY OF ANY KIND, EITHER EXPRESSED OR IMPLIED, INCLUDING, BUT NOT LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE. THE ENTIRE RISK AS TO THE QUALITY AND PERFORMANCE OF THE PROGRAM IS WITH YOU. SHOULD THE PROGRAM PROVE DEFECTIVE, YOU ASSUME THE COST OF ALL NECESSARY SERVICING, REPAIR OR CORRECTION. - -16. Limitation of Liability. -IN NO EVENT UNLESS REQUIRED BY APPLICABLE LAW OR AGREED TO IN WRITING WILL ANY COPYRIGHT HOLDER, OR ANY OTHER PARTY WHO MODIFIES AND/OR CONVEYS THE PROGRAM AS PERMITTED ABOVE, BE LIABLE TO YOU FOR DAMAGES, INCLUDING ANY GENERAL, SPECIAL, INCIDENTAL OR CONSEQUENTIAL DAMAGES ARISING OUT OF THE USE OR INABILITY TO USE THE PROGRAM (INCLUDING BUT NOT LIMITED TO LOSS OF DATA OR DATA BEING RENDERED INACCURATE OR LOSSES SUSTAINED BY YOU OR THIRD PARTIES OR A FAILURE OF THE PROGRAM TO OPERATE WITH ANY OTHER PROGRAMS), EVEN IF SUCH HOLDER OR OTHER PARTY HAS BEEN ADVISED OF THE POSSIBILITY OF SUCH DAMAGES. - -17. Interpretation of Sections 15 and 16. -If the disclaimer of warranty and limitation of liability provided above cannot be given local legal effect according to their terms, reviewing courts shall apply local law that most closely approximates an absolute waiver of all civil liability in connection with the Program, unless a warranty or assumption of liability accompanies a copy of the Program in return for a fee. - -END OF TERMS AND CONDITIONS - -How to Apply These Terms to Your New Programs - -If you develop a new program, and you want it to be of the greatest possible use to the public, the best way to achieve this is to make it free software which everyone can redistribute and change under these terms. - -To do so, attach the following notices to the program. It is safest to attach them to the start of each source file to most effectively state the exclusion of warranty; and each file should have at least the “copyright” line and a pointer to where the full notice is found. - - - Copyright (C) - - This program is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. - - This program is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. - - You should have received a copy of the GNU General Public License along with this program. If not, see . - -Also add information on how to contact you by electronic and paper mail. - -If the program does terminal interaction, make it output a short notice like this when it starts in an interactive mode: - - Copyright (C) - This program comes with ABSOLUTELY NO WARRANTY; for details type `show w'. - This is free software, and you are welcome to redistribute it under certain conditions; type `show c' for details. - -The hypothetical commands `show w' and `show c' should show the appropriate parts of the General Public License. Of course, your program's commands might be different; for a GUI interface, you would use an “about box”. - -You should also get your employer (if you work as a programmer) or school, if any, to sign a “copyright disclaimer” for the program, if necessary. For more information on this, and how to apply and follow the GNU GPL, see . - -The GNU General Public License does not permit incorporating your program into proprietary programs. If your program is a subroutine library, you may consider it more useful to permit linking proprietary applications with the library. If this is what you want to do, use the GNU Lesser General Public License instead of this License. But first, please read . diff --git a/README.md b/README.md deleted file mode 100644 index 0865df5..0000000 --- a/README.md +++ /dev/null @@ -1,3 +0,0 @@ -# COVID - -downloads data from the NYtimes and makes graphs in R \ No newline at end of file diff --git a/data/co-est2020-alldata.csv b/data/co-est2020-alldata.csv new file mode 100644 index 0000000..642d39c --- /dev/null +++ b/data/co-est2020-alldata.csv @@ -0,0 +1,3195 @@ +SUMLEV,REGION,DIVISION,STATE,COUNTY,STNAME,CTYNAME,CENSUS2010POP,ESTIMATESBASE2010,POPESTIMATE2010,POPESTIMATE2011,POPESTIMATE2012,POPESTIMATE2013,POPESTIMATE2014,POPESTIMATE2015,POPESTIMATE2016,POPESTIMATE2017,POPESTIMATE2018,POPESTIMATE2019,POPESTIMATE2020,NPOPCHG_2010,NPOPCHG_2011,NPOPCHG_2012,NPOPCHG_2013,NPOPCHG_2014,NPOPCHG_2015,NPOPCHG_2016,NPOPCHG_2017,NPOPCHG_2018,NPOPCHG_2019,NPOPCHG_2020,BIRTHS2010,BIRTHS2011,BIRTHS2012,BIRTHS2013,BIRTHS2014,BIRTHS2015,BIRTHS2016,BIRTHS2017,BIRTHS2018,BIRTHS2019,BIRTHS2020,DEATHS2010,DEATHS2011,DEATHS2012,DEATHS2013,DEATHS2014,DEATHS2015,DEATHS2016,DEATHS2017,DEATHS2018,DEATHS2019,DEATHS2020,NATURALINC2010,NATURALINC2011,NATURALINC2012,NATURALINC2013,NATURALINC2014,NATURALINC2015,NATURALINC2016,NATURALINC2017,NATURALINC2018,NATURALINC2019,NATURALINC2020,INTERNATIONALMIG2010,INTERNATIONALMIG2011,INTERNATIONALMIG2012,INTERNATIONALMIG2013,INTERNATIONALMIG2014,INTERNATIONALMIG2015,INTERNATIONALMIG2016,INTERNATIONALMIG2017,INTERNATIONALMIG2018,INTERNATIONALMIG2019,INTERNATIONALMIG2020,DOMESTICMIG2010,DOMESTICMIG2011,DOMESTICMIG2012,DOMESTICMIG2013,DOMESTICMIG2014,DOMESTICMIG2015,DOMESTICMIG2016,DOMESTICMIG2017,DOMESTICMIG2018,DOMESTICMIG2019,DOMESTICMIG2020,NETMIG2010,NETMIG2011,NETMIG2012,NETMIG2013,NETMIG2014,NETMIG2015,NETMIG2016,NETMIG2017,NETMIG2018,NETMIG2019,NETMIG2020,RESIDUAL2010,RESIDUAL2011,RESIDUAL2012,RESIDUAL2013,RESIDUAL2014,RESIDUAL2015,RESIDUAL2016,RESIDUAL2017,RESIDUAL2018,RESIDUAL2019,RESIDUAL2020,GQESTIMATESBASE2010,GQESTIMATES2010,GQESTIMATES2011,GQESTIMATES2012,GQESTIMATES2013,GQESTIMATES2014,GQESTIMATES2015,GQESTIMATES2016,GQESTIMATES2017,GQESTIMATES2018,GQESTIMATES2019,GQESTIMATES2020,RBIRTH2011,RBIRTH2012,RBIRTH2013,RBIRTH2014,RBIRTH2015,RBIRTH2016,RBIRTH2017,RBIRTH2018,RBIRTH2019,RBIRTH2020,RDEATH2011,RDEATH2012,RDEATH2013,RDEATH2014,RDEATH2015,RDEATH2016,RDEATH2017,RDEATH2018,RDEATH2019,RDEATH2020,RNATURALINC2011,RNATURALINC2012,RNATURALINC2013,RNATURALINC2014,RNATURALINC2015,RNATURALINC2016,RNATURALINC2017,RNATURALINC2018,RNATURALINC2019,RNATURALINC2020,RINTERNATIONALMIG2011,RINTERNATIONALMIG2012,RINTERNATIONALMIG2013,RINTERNATIONALMIG2014,RINTERNATIONALMIG2015,RINTERNATIONALMIG2016,RINTERNATIONALMIG2017,RINTERNATIONALMIG2018,RINTERNATIONALMIG2019,RINTERNATIONALMIG2020,RDOMESTICMIG2011,RDOMESTICMIG2012,RDOMESTICMIG2013,RDOMESTICMIG2014,RDOMESTICMIG2015,RDOMESTICMIG2016,RDOMESTICMIG2017,RDOMESTICMIG2018,RDOMESTICMIG2019,RDOMESTICMIG2020,RNETMIG2011,RNETMIG2012,RNETMIG2013,RNETMIG2014,RNETMIG2015,RNETMIG2016,RNETMIG2017,RNETMIG2018,RNETMIG2019,RNETMIG2020 +040,3,6,01,000,Alabama,Alabama,4779736,4780118,4785514,4799642,4816632,4831586,4843737,4854803,4866824,4877989,4891628,4907965,4921532,5396,14128,16990,14954,12151,11066,12021,11165,13639,16337,13567,14202,59699,59074,57943,58914,59653,59695,58644,58665,57251,56739,11077,48837,48363,50853,49720,51878,51711,53196,54560,54038,58354,3125,10862,10711,7090,9194,7775,7984,5448,4105,3213,-1615,1053,5162,6282,5494,4159,5095,6301,3546,3940,2293,2078,1225,-1903,-114,2294,-996,-1553,-2148,2287,5664,10828,13115,2278,3259,6168,7788,3163,3542,4153,5833,9604,13121,15193,-7,7,111,76,-206,-251,-116,-116,-70,3,-11,116185,116242,115184,115810,116946,119052,119980,118641,117111,116600,116778,116767,12.456552611,12.286255571,12.011129931,12.178198082,12.301439186,12.280866155,12.035941582,12.009682672,11.68436281,11.544639568,10.190131491,10.058573622,10.541428479,10.277693055,10.698105076,10.638342738,10.917808274,11.169322196,11.028621291,11.873242344,2.2664211203,2.2276819483,1.4697014516,1.9005050271,1.6033341101,1.6425234171,1.1181333085,0.8403604768,0.6557415191,-0.328602776,1.0770821049,1.3065351507,1.1388631559,0.8597129005,1.0506736065,1.2962850766,0.72777179,0.8065822846,0.4679786191,0.4228090206,-0.397072306,-0.023709807,0.4755282271,-0.205884599,-0.320254389,-0.44190134,0.4693779142,1.1595132133,2.2098876964,2.6684987034,0.6800097985,1.2828253438,1.6143913829,0.6538283011,0.7304192177,0.8543837364,1.1971497042,1.9660954979,2.6778663155,3.0913077241 +050,3,6,01,001,Alabama,Autauga County,54571,54582,54761,55229,54970,54747,54922,54903,55302,55448,55533,55769,56145,179,468,-259,-223,175,-19,399,146,85,236,376,151,639,615,570,637,652,675,667,651,592,606,157,514,560,584,572,585,547,574,563,552,582,-6,125,55,-14,65,67,128,93,88,40,24,28,16,0,19,19,23,7,-3,2,-14,-8,147,327,-329,-226,102,-107,266,58,-3,208,360,175,343,-329,-207,121,-84,273,55,-1,194,352,10,0,15,-2,-11,-2,-2,-2,-2,2,0,455,455,455,455,455,455,455,455,455,455,455,455,11.619238113,11.161625786,10.390367947,11.616774111,11.87343501,12.249897918,12.045146727,11.731737865,10.637724389,10.829744268,9.3463042095,10.16343161,10.645569966,10.431388998,10.653312087,9.9269543124,10.365688488,10.145880826,9.918959228,10.400843505,2.2729339031,0.998194176,-0.25520202,1.1853851134,1.2201229228,2.3229436051,1.6794582393,1.5858570386,0.7187651615,0.4289007631,0.2909355396,0,0.3463455982,0.346497187,0.4188481675,0.1270359784,-0.054176072,0.0360422054,-0.251567807,-0.142966921,5.9459950905,-5.971016071,-4.119689747,1.8601427933,-1.948554519,4.8273671793,1.0474040632,-0.054063308,3.7375788396,6.4335114463,6.2369306301,-5.971016071,-3.773344149,2.2066399803,-1.529706351,4.9544031578,0.993227991,-0.018021103,3.486011033,6.2905445253 +050,3,6,01,003,Alabama,Baldwin County,182265,182263,183121,186579,190203,194978,199306,203101,207787,212737,218071,223565,229287,858,3458,3624,4775,4328,3795,4686,4950,5334,5494,5722,514,2186,2092,2162,2215,2261,2286,2313,2297,2322,2317,534,1829,1883,1902,1988,2099,2021,2103,2325,2386,2543,-20,357,209,260,227,162,265,210,-28,-64,-226,51,192,273,240,141,165,211,104,118,63,60,780,2896,3056,4175,3861,3437,4193,4622,5234,5511,5918,831,3088,3329,4415,4002,3602,4404,4726,5352,5574,5978,47,13,86,100,99,31,17,14,10,-16,-30,2307,2307,2263,2242,2296,2331,2337,2276,2192,2171,2268,2268,11.825804707,11.104564443,11.225891204,11.235556097,11.237379071,11.127119799,11.000561205,10.663683126,10.51544711,10.232923781,9.8945090614,9.9951696206,9.875876536,10.084101815,10.432224092,9.8372305835,10.001807269,10.793671427,10.805278555,11.231042371,1.9312956451,1.1093948225,1.3500146684,1.1514542817,0.8051549799,1.2898892156,0.9987539356,-0.129988301,-0.289831445,-0.998118591,1.0386800108,1.4491138112,1.2461673862,0.715220501,0.8200652573,1.027043866,0.4946209967,0.5478078402,0.2853028286,0.2649872364,15.66675683,16.22158171,21.678120156,19.58486776,17.082207814,20.409454645,21.982098525,24.298527418,24.957204576,26.136574422,16.705436841,17.670695522,22.924287543,20.300088261,17.902273072,21.436498511,22.476719521,24.846335258,25.242507404,26.401561658 +050,3,6,01,005,Alabama,Barbour County,27457,27454,27325,27344,27172,26946,26768,26300,25828,25169,24887,24657,24589,-129,19,-172,-226,-178,-468,-472,-659,-282,-230,-68,70,335,301,284,265,274,284,276,273,248,250,131,324,286,293,308,332,279,297,335,322,334,-61,11,15,-9,-43,-58,5,-21,-62,-74,-84,0,-5,-11,-8,5,13,13,9,8,6,6,-69,14,-176,-211,-141,-429,-492,-650,-228,-161,10,-69,9,-187,-219,-136,-416,-479,-641,-220,-155,16,1,-1,0,2,1,6,2,3,0,-1,0,3193,3193,3381,3391,3388,3353,3195,2977,2819,2813,2778,2777,12.255574457,11.042629687,10.495583724,9.867073761,10.326373709,10.896255371,10.824166127,10.907783283,10.011303084,10.153108882,11.853152609,10.492332526,10.828190251,11.468146107,12.512248436,10.70441989,11.647743985,13.38500879,12.998546746,13.564553466,0.4024218478,0.5502971605,-0.332606526,-1.601072346,-2.185874727,0.1918354819,-0.823577858,-2.477225507,-2.987243662,-3.411444584,-0.182919022,-0.403551251,-0.295650246,0.186171203,0.4899374388,0.4987722529,0.3529619389,0.319642001,0.2422089456,0.2436746132,0.5121732609,-6.456820016,-7.797775232,-5.250027926,-16.16793548,-18.87661142,-25.49169559,-9.109797027,-6.499273373,0.4061243553,0.3292542391,-6.860371267,-8.093425478,-5.063856723,-15.67799804,-18.37783917,-25.13873365,-8.790155026,-6.257064428,0.6497989684 +050,3,6,01,007,Alabama,Bibb County,22915,22904,22858,22736,22657,22510,22541,22553,22590,22532,22300,22313,22136,-46,-122,-79,-147,31,12,37,-58,-232,13,-177,44,265,245,258,253,252,299,267,243,238,249,32,277,236,276,250,266,243,251,314,232,266,12,-12,9,-18,3,-14,56,16,-71,6,-17,0,12,19,20,14,14,11,7,8,7,6,-59,-124,-105,-151,18,15,-30,-80,-171,-1,-166,-59,-112,-86,-131,32,29,-19,-73,-163,6,-160,1,2,-2,2,-4,-3,0,-1,2,1,0,2224,2224,2224,2228,2224,2247,2255,2204,2153,2147,2122,2121,11.624336536,10.79461591,11.424269932,11.231715167,11.176653213,13.246793523,11.8345818,10.840471092,10.669535786,11.203851605,12.150721586,10.398078999,12.22131202,11.098532774,11.797578392,10.765788716,11.125393378,14.007851535,10.400555892,11.968773201,-0.526385051,0.396536911,-0.797042088,0.1331823933,-0.620925179,2.4810048069,0.7091884225,-3.167380443,0.2689798938,-0.764921596,0.5263850507,0.8371334787,0.8856023203,0.6215178353,0.6209251785,0.4873402299,0.3102699348,0.3568879372,0.313809876,0.2699723278,-5.43931219,-4.626263961,-6.686297518,0.7990943597,0.665276977,-1.329109718,-3.545942112,-7.628479657,-0.044829982,-7.469234403,-4.91292714,-3.789130483,-5.800695198,1.4206121951,1.2862021555,-0.841769488,-3.235672178,-7.27159172,0.2689798938,-7.199262076 +050,3,6,01,009,Alabama,Blount County,57322,57322,57372,57561,57585,57630,57536,57535,57487,57801,57770,57840,57879,50,189,24,45,-94,-1,-48,314,-31,70,39,181,741,714,647,620,715,675,681,675,673,665,132,569,587,582,591,634,651,721,718,658,697,49,172,127,65,29,81,24,-40,-43,15,-32,-2,-8,8,49,43,15,32,0,4,-4,1,9,28,-100,-65,-158,-90,-102,357,10,58,68,7,20,-92,-16,-115,-75,-70,357,14,54,69,-6,-3,-11,-4,-8,-7,-2,-3,-2,1,2,489,489,489,489,489,489,489,489,489,489,489,489,12.894468951,12.401646605,11.231176496,10.767066669,12.427110219,11.736885118,11.813892166,11.68113108,11.642591471,11.493358913,9.9014208278,10.195751481,10.102851191,10.263445809,11.019283747,11.319573647,12.507806537,12.425262393,11.383098348,12.0464228,2.9930481237,2.2058951245,1.1283253049,0.5036208603,1.4078264724,0.4173114708,-0.693914371,-0.744131313,0.2594931234,-0.553063888,-0.139211541,0.1389540236,0.8505836914,0.7467481722,0.260708606,0.5564152945,0,0.0692215175,-0.069198166,0.0172832465,0.4872403922,-1.736925295,-1.128325305,-2.743865377,-1.564251636,-1.773573751,6.1931857609,0.1730537938,1.0033734106,1.175260761,0.3480288516,-1.597971271,-0.277741614,-1.997117205,-1.30354303,-1.217158457,6.1931857609,0.2422753113,0.9341752444,1.1925440075 +050,3,6,01,011,Alabama,Bullock County,10914,10913,10876,10680,10610,10557,10668,10404,10397,10181,10165,10144,9976,-37,-196,-70,-53,111,-264,-7,-216,-16,-21,-168,37,172,121,131,123,124,147,129,112,110,114,53,133,117,119,116,133,131,143,120,95,116,-16,39,4,12,7,-9,16,-14,-8,15,-2,1,19,8,18,6,1,8,10,14,1,5,-24,-255,-81,-83,94,-260,-31,-213,-23,-37,-170,-23,-236,-73,-65,100,-259,-23,-203,-9,-36,-165,2,1,-1,0,4,4,0,1,1,0,-1,1690,1690,1690,1779,1719,1757,1661,1729,1662,1663,1705,1704,15.958433847,11.366838891,12.377757831,11.590106007,11.769172361,14.133935868,12.53766158,11.009535044,10.832635777,11.332007952,12.339951754,10.991075622,11.243917419,10.930506478,12.623386484,12.595548291,13.898338031,11.795930404,9.3554581713,11.530815109,3.6184820932,0.3757632691,1.133840412,0.6595995289,-0.854214123,1.5383875775,-1.360676451,-0.78639536,1.477177606,-0.198807157,1.7628502505,0.7515265383,1.7007606179,0.5653710247,0.0949126803,0.7691937888,0.9719117504,1.3761918805,0.0984785071,0.4970178926,-23.65930599,-7.6092062,-7.842396183,8.8574793875,-24.67729689,-2.980625931,-20.70172028,-2.260886661,-3.643704761,-16.89860835,-21.89645574,-6.857679662,-6.141635565,9.4228504122,-24.58238421,-2.211432143,-19.72980853,-0.88469478,-3.545226254,-16.40159046 +050,3,6,01,013,Alabama,Butler County,20947,20940,20933,20867,20672,20359,20332,20168,20040,19911,19675,19501,19504,-7,-66,-195,-313,-27,-164,-128,-129,-236,-174,3,66,273,242,240,252,238,236,239,220,205,200,66,264,274,262,287,276,253,269,272,272,266,0,9,-32,-22,-35,-38,-17,-30,-52,-67,-66,0,2,6,8,22,28,44,23,21,19,16,-4,-77,-170,-304,-11,-153,-154,-121,-205,-124,52,-4,-75,-164,-296,11,-125,-110,-98,-184,-105,68,-3,0,1,5,-3,-1,-1,-1,0,-2,1,333,333,333,333,333,333,333,333,333,333,333,333,13.062200957,11.651700811,11.698471887,12.386031309,11.75308642,11.738957421,11.964656704,11.115040671,10.465591178,10.255095501,12.631578947,13.19242158,12.77083181,14.106313435,13.62962963,12.584560287,13.466496458,13.742232102,13.886052685,13.639277016,0.4306220096,-1.540720768,-1.072359923,-1.720282126,-1.87654321,-0.845602865,-1.501839754,-2.627191431,-3.420461507,-3.384181515,0.0956937799,0.2888851441,0.3899490629,1.0813201937,1.3827160494,2.1886191803,1.1514104778,1.060981155,0.9699816214,0.82040764,-3.684210526,-8.185079082,-14.81806439,-0.540660097,-7.555555556,-7.660167131,-6.05742034,-10.35719699,-6.330406371,2.6663248301,-3.588516746,-7.896193938,-14.42811533,0.5406600968,-6.172839506,-5.471547951,-4.906009862,-9.296215834,-5.36042475,3.4867324702 +050,3,6,01,015,Alabama,Calhoun County,118572,118533,118420,117767,117227,116528,115991,115550,115036,114746,114298,114070,113469,-113,-653,-540,-699,-537,-441,-514,-290,-448,-228,-601,316,1384,1356,1307,1316,1386,1365,1338,1287,1271,1230,311,1325,1359,1411,1395,1455,1475,1393,1645,1486,1553,5,59,-3,-104,-79,-69,-110,-55,-358,-215,-323,3,39,81,68,84,77,98,31,50,-1,10,-113,-752,-607,-660,-533,-441,-500,-260,-136,-15,-289,-110,-713,-526,-592,-449,-364,-402,-229,-86,-16,-279,-8,1,-11,-3,-9,-8,-2,-6,-4,3,1,2933,2933,2882,2958,2813,2799,2774,2762,2743,2830,3286,3285,11.719527324,11.540720189,11.182648499,11.319505073,11.971961769,11.839400484,11.645820821,11.238015403,11.131156729,10.811333442,11.219923196,11.566252755,12.072469038,11.999019435,12.567968524,12.793491365,12.124535429,14.364052322,13.014082533,13.650407183,0.4996041272,-0.025532567,-0.889820539,-0.679514362,-0.596006755,-0.954090881,-0.478714608,-3.126036919,-1.882925804,-2.839073741,0.330246796,0.6893793033,0.5818057368,0.7225216004,0.6651089872,0.8500082399,0.2698209607,0.436597335,-0.008757794,0.0878970199,-6.367835656,-5.166089347,-5.646938033,-4.584571583,-3.809260563,-4.336776734,-2.263014509,-1.187544751,-0.131366917,-2.540223874,-6.03758886,-4.476710044,-5.065132297,-3.862049983,-3.144151576,-3.486768494,-1.993193549,-0.750947416,-0.140124711,-2.452326854 +050,3,6,01,017,Alabama,Chambers County,34215,34154,34105,34016,34088,34125,33964,33991,33742,33716,33570,33244,32865,-49,-89,72,37,-161,27,-249,-26,-146,-326,-379,81,400,392,407,425,422,387,380,344,362,334,80,442,476,454,455,445,444,485,415,449,519,1,-42,-84,-47,-30,-23,-57,-105,-71,-87,-185,6,28,34,29,32,21,18,18,19,16,13,-54,-74,122,57,-158,31,-209,65,-93,-255,-208,-48,-46,156,86,-126,52,-191,83,-74,-239,-195,-2,-1,0,-2,-5,-2,-1,-4,-1,0,1,458,458,458,458,458,458,458,458,458,458,458,458,11.743808811,11.511805474,11.933209212,12.483661091,12.419983813,11.427221591,11.266269382,10.22500966,10.836052324,10.104524346,12.976908736,13.978620933,13.311245657,13.364860697,13.096902362,13.11030074,14.379317501,12.335404096,13.440296944,15.701341724,-1.233099925,-2.466815459,-1.378036445,-0.881199606,-0.676918549,-1.683079149,-3.113048119,-2.110394436,-2.604244619,-5.596817377,0.8220666168,0.9984729238,0.8502778063,0.9399462468,0.6180560665,0.5314986786,0.5336653918,0.5647534405,0.4789415392,0.3932898698,-2.17260463,3.5827557853,1.6712356882,-4.640984594,0.9123684791,-6.171290213,1.9271250259,-2.764319472,-7.633130781,-6.292637916,-1.350538013,4.581228709,2.5215134945,-3.701038347,1.5304245457,-5.639791534,2.4607904177,-2.199566032,-7.154189242,-5.899348046 +050,3,6,01,019,Alabama,Cherokee County,25989,25984,25968,25993,25961,26022,25900,25739,25769,25822,26035,26254,26294,-16,25,-32,61,-122,-161,30,53,213,219,40,54,219,244,232,250,231,234,237,215,234,236,110,308,333,341,346,337,345,364,346,366,406,-56,-89,-89,-109,-96,-106,-111,-127,-131,-132,-170,1,0,8,10,0,0,3,2,2,2,2,41,116,53,161,-20,-52,141,178,341,350,208,42,116,61,171,-20,-52,144,180,343,352,210,-2,-2,-4,-1,-6,-3,-3,0,1,-1,0,290,290,290,290,290,290,290,290,290,290,290,290,8.4293989723,9.3929245101,8.9259950368,9.6298293594,8.9467263115,9.0859672284,9.1876490085,8.2920338624,8.9502572243,8.982263835,11.85504513,12.819032221,13.119673739,13.327683833,13.052150506,13.395977324,14.110988351,13.344389378,13.999120274,15.452538631,-3.425646158,-3.426107711,-4.193678703,-3.697854474,-4.105424195,-4.310010096,-4.923339342,-5.052355516,-5.04886305,-6.470274796,0,0.307964738,0.3847411654,0,0,0.1164867593,0.077532903,0.0771351987,0.076497925,0.07612088,4.4648871269,2.0402663895,6.1943327626,-0.770386349,-2.013981681,5.4748776889,6.9004283693,13.151551382,13.387136874,7.9165715156,4.4648871269,2.3482311275,6.579073928,-0.770386349,-2.013981681,5.5913644482,6.9779612723,13.22868658,13.463634799,7.9926923955 +050,3,6,01,021,Alabama,Chilton County,43643,43625,43645,43682,43572,43617,43751,43693,43854,44085,44084,44313,44397,20,37,-110,45,134,-58,161,231,-1,229,84,123,566,564,534,597,534,548,540,538,541,533,144,474,495,499,485,502,475,490,552,486,554,-21,92,69,35,112,32,73,50,-14,55,-21,-2,27,-6,11,20,32,45,14,30,6,6,47,-82,-170,3,13,-119,46,168,-15,170,95,45,-55,-176,14,33,-87,91,182,15,176,101,-4,0,-3,-4,-11,-3,-3,-1,-2,-2,4,393,393,393,393,393,393,393,393,393,393,393,393,12.962772109,12.927774085,12.249251626,13.666330922,12.213530946,12.5189898,12.281240405,12.203835815,12.240234397,12.016683576,10.855749081,11.346184702,11.446398055,11.102463144,11.48163396,10.851314151,11.144088516,12.521407751,10.995848275,12.4901364,2.1070230284,1.5815893827,0.802853571,2.5638677777,0.7318969855,1.6676756485,1.1371518894,-0.317571936,1.2443861217,-0.473452824,0.618365454,-0.137529512,0.252325408,0.4578335317,0.7318969855,1.0280192354,0.318402529,0.6805112908,0.1357512133,0.1352722354,-1.877998786,-3.896669494,0.0688160204,0.2975917956,-2.721741915,1.0508641073,3.8208303483,-0.340255645,3.8462843762,2.1418103934,-1.259633332,-4.034199005,0.3211414284,0.7554253274,-1.989844929,2.0788833427,4.1392328773,0.3402556454,3.9820355894,2.2770826288 +050,3,6,01,023,Alabama,Choctaw County,13859,13858,13848,13608,13565,13401,13322,13237,13049,12923,12810,12577,12418,-10,-240,-43,-164,-79,-85,-188,-126,-113,-233,-159,28,114,111,138,143,159,147,130,139,137,136,21,160,144,194,178,185,182,178,195,171,183,7,-46,-33,-56,-35,-26,-35,-48,-56,-34,-47,1,-1,0,-1,-2,-1,-6,-5,-5,-5,-5,-18,-194,-6,-108,-40,-58,-148,-72,-51,-193,-107,-17,-195,-6,-109,-42,-59,-154,-77,-56,-198,-112,0,1,-4,1,-2,0,1,-1,-1,-1,0,129,129,129,129,129,129,129,129,129,129,129,129,8.3041958042,8.1698745078,10.23511088,10.702391199,11.97334237,11.184661036,10.010780841,10.803248747,10.792925513,10.882176435,11.655011655,10.598756118,14.388489209,13.321857576,13.931247411,13.847675569,13.707069151,15.155636731,13.471461772,14.642928586,-3.350815851,-2.42888161,-4.153378328,-2.619466377,-1.957905042,-2.663014532,-3.69628831,-4.352387984,-2.678536259,-3.76075215,-0.072843823,0,-0.07416747,-0.149683793,-0.07530404,-0.456516777,-0.385030032,-0.38860607,-0.393902391,-0.400080016,-14.13170163,-0.441614838,-8.010086776,-2.99367586,-4.367634324,-11.26074717,-5.544432466,-3.963781914,-15.20463229,-8.561712342,-14.20454545,-0.441614838,-8.084254246,-3.143359653,-4.442938364,-11.71726394,-5.929462498,-4.352387984,-15.59853468,-8.961792358 +050,3,6,01,025,Alabama,Clarke County,25833,25834,25767,25589,25161,25131,24873,24711,24342,24083,23965,23651,23291,-67,-178,-428,-30,-258,-162,-369,-259,-118,-314,-360,49,260,293,271,267,312,263,271,296,257,265,45,300,288,293,297,296,285,308,273,336,348,4,-40,5,-22,-30,16,-22,-37,23,-79,-83,2,3,6,6,-1,-2,-1,-1,-1,-1,-1,-78,-141,-451,-10,-230,-177,-348,-221,-140,-233,-275,-76,-138,-445,-4,-231,-179,-349,-222,-141,-234,-276,5,0,12,-4,3,1,2,0,0,-1,-1,280,280,280,280,280,280,280,280,280,280,280,280,10.125399174,11.54679803,10.777061958,10.679145668,12.584704743,10.723095427,11.192565823,12.321012321,10.79469086,11.290528738,11.683152894,11.349753695,11.651952597,11.879049676,11.939335269,11.620084399,12.720702117,11.363636364,14.112903226,14.82680755,-1.557753719,0.197044335,-0.874890639,-1.199904008,0.645369474,-0.896988971,-1.528136293,0.9573759574,-3.318212366,-3.536278812,0.1168315289,0.236453202,0.2386065378,-0.0399968,-0.080671184,-0.040772226,-0.041300981,-0.041625042,-0.042002688,-0.042605769,-5.49108186,-17.77339901,-0.397677563,-9.199264059,-7.139399806,-14.18873463,-9.127516779,-5.827505828,-9.786626344,-11.71658643,-5.374250331,-17.53694581,-0.159071025,-9.239260859,-7.220070991,-14.22950686,-9.168817759,-5.869130869,-9.828629032,-11.75919219 +050,3,6,01,027,Alabama,Clay County,13932,13930,13897,13687,13433,13406,13443,13415,13393,13355,13301,13265,13112,-33,-210,-254,-27,37,-28,-22,-38,-54,-36,-153,26,151,147,121,150,152,135,133,153,156,158,38,211,183,171,171,200,178,178,173,186,224,-12,-60,-36,-50,-21,-48,-43,-45,-20,-30,-66,0,3,-1,0,-1,-3,-1,-1,-1,-1,-1,-21,-153,-222,26,61,24,23,8,-32,-4,-87,-21,-150,-223,26,60,21,22,7,-33,-5,-88,0,0,5,-3,-2,-1,-1,0,-1,-1,1,255,255,255,255,255,255,255,255,255,255,255,255,10.94837587,10.840707965,9.0167293863,11.173600507,11.318787698,10.071620412,9.9446687603,11.479591837,11.744334864,11.980134208,15.298723898,13.495575221,12.74265062,12.737904577,14.893141708,13.279618024,13.309406311,12.980192077,14.0028608,16.984494067,-4.350348028,-2.654867257,-3.725921234,-1.564304071,-3.57435401,-3.207997613,-3.36473755,-1.50060024,-2.258525935,-5.004359859,0.2175174014,-0.073746313,0,-0.07449067,-0.223397126,-0.074604596,-0.074771946,-0.075030012,-0.075284198,-0.075823634,-11.09338747,-16.37168142,1.9374790417,4.5439308727,1.787177005,1.7159056998,0.5981755645,-2.400960384,-0.301136791,-6.596656178,-10.87587007,-16.44542773,1.9374790417,4.4694402026,1.5637798794,1.6413011041,0.523403619,-2.475990396,-0.376420989,-6.672479812 +050,3,6,01,029,Alabama,Cleburne County,14972,14972,15004,14928,14889,14974,15029,14923,14871,14924,15047,14952,14967,32,-76,-39,85,55,-106,-52,53,123,-95,15,42,184,183,175,201,149,167,163,195,178,177,22,175,159,187,190,209,205,176,187,203,216,20,9,24,-12,11,-60,-38,-13,8,-25,-39,0,0,-1,-4,-4,-6,-3,-2,-2,-3,-2,13,-85,-64,102,49,-37,-12,69,118,-66,56,13,-85,-65,98,45,-43,-15,67,116,-69,54,-1,0,2,-1,-1,-3,1,-1,-1,-1,0,178,178,178,178,178,178,178,178,178,178,178,178,12.294534278,12.274876748,11.720188862,13.398660134,9.9492521368,11.210310801,10.941433126,13.012578826,11.867062235,11.831946255,11.693171188,10.665056847,12.523858956,12.665400127,13.955662393,13.761159965,11.814062762,12.478729438,13.533784459,14.43898526,0.6013630897,1.6098199014,-0.803670093,0.7332600073,-4.006410256,-2.550849164,-0.872629636,0.5338493877,-1.666722224,-2.607039005,0,-0.067075829,-0.267890031,-0.266640003,-0.400641026,-0.201382829,-0.134250713,-0.133462347,-0.200006667,-0.133694308,-5.679540291,-4.29285307,6.8311957941,3.2663400327,-2.470619658,-0.805531315,4.6316496056,7.8742784692,-4.400146672,3.743440623,-5.679540291,-4.3599289,6.563305763,2.99970003,-2.871260684,-1.006914144,4.4973988924,7.7408161223,-4.600153338,3.6097463151 +050,3,6,01,031,Alabama,Coffee County,49948,49951,50204,50449,51159,50709,50693,51004,51281,51943,52097,52639,53230,253,245,710,-450,-16,311,277,662,154,542,591,166,681,625,616,620,618,674,626,605,590,568,77,508,494,519,468,532,508,513,555,566,590,89,173,131,97,152,86,166,113,50,24,-22,42,86,222,117,61,96,119,93,86,54,51,117,-13,351,-679,-233,133,-5,457,20,466,562,159,73,573,-562,-172,229,114,550,106,520,613,5,-1,6,15,4,-4,-3,-1,-2,-2,0,600,600,600,600,600,600,600,544,518,498,600,600,13.531638401,12.302180931,12.094082538,12.22855565,12.153750848,13.178862981,12.128962257,11.630142253,11.266422243,10.730242092,10.094085621,9.7236438076,10.189657203,9.2305871679,10.462452186,9.9330302586,9.9395489421,10.668973472,10.808127101,11.14585006,3.4375527803,2.5785371231,1.9044253347,2.9979684819,1.6912986617,3.2458327223,2.1894133147,0.9611687812,0.4582951421,-0.415607968,1.7088412665,4.3697346666,2.2970903522,1.2031320881,1.8879612968,2.3268318913,1.8019065334,1.6532103037,1.0311640697,0.9634548357,-0.258313215,6.9089048106,-13.33097734,-4.595570107,2.6156130466,-0.097766046,8.8545299543,0.3844675125,8.8985640086,10.616894464,1.4505280518,11.278639477,-11.03388699,-3.392438019,4.5035743434,2.2290658454,10.656436488,2.0376778162,9.9297280782,11.5803493 +050,3,6,01,033,Alabama,Colbert County,54428,54430,54527,54545,54578,54544,54484,54439,54483,54682,54970,55241,55411,97,18,33,-34,-60,-45,44,199,288,271,170,162,606,623,593,597,604,615,650,612,649,631,130,672,671,724,717,743,708,738,741,721,724,32,-66,-48,-131,-120,-139,-93,-88,-129,-72,-93,8,31,13,10,9,59,86,50,53,47,33,59,56,78,95,64,43,54,239,364,296,230,67,87,91,105,73,102,140,289,417,343,263,-2,-3,-10,-8,-13,-8,-3,-2,0,0,0,474,474,474,474,474,474,474,474,474,474,474,474,11.111926067,11.418307781,10.868569124,10.951315258,11.090403312,11.29248453,11.908578757,11.162587094,11.777408789,11.405125981,12.322135837,12.298048991,13.269551511,13.152584657,13.642665002,13.000128532,13.520817112,13.515485354,13.083993431,13.086071648,-1.21020977,-0.879741209,-2.400982387,-2.201269399,-2.552261689,-1.707644002,-1.612238355,-2.35289826,-1.306584642,-1.680945667,0.5684318615,0.2382632442,0.1832810982,0.1650952049,1.0833340984,1.5791116579,0.9160445198,0.9666946339,0.8529094192,0.5964645917,1.0268446531,1.4295794654,1.7411704331,1.174010346,0.7895485802,0.991535227,4.3786928045,6.6391857878,5.3715146401,4.1571774573,1.5952765146,1.6678427096,1.9244515313,1.3391055509,1.8728826786,2.5706468849,5.2947373242,7.6058804217,6.2244240593,4.7536420489 +050,3,6,01,035,Alabama,Conecuh County,13228,13232,13234,13194,13043,12908,12674,12677,12495,12431,12264,12055,11851,2,-40,-151,-135,-234,3,-182,-64,-167,-209,-204,35,159,143,151,131,155,141,121,140,122,119,13,190,170,194,172,171,174,154,195,167,199,22,-31,-27,-43,-41,-16,-33,-33,-55,-45,-80,0,0,0,2,0,2,1,0,1,0,0,-20,-9,-128,-94,-196,19,-151,-28,-112,-163,-124,-20,-9,-128,-92,-196,21,-150,-28,-111,-163,-124,0,0,4,0,3,-2,1,-3,-1,-1,0,45,45,45,45,45,45,45,45,45,45,45,45,12.032692599,10.900636506,11.637316481,10.241576108,12.228314465,11.202923884,9.7087378641,11.338327597,10.033307291,9.955659667,14.378689269,12.958798643,14.951254287,13.44695489,13.490592087,13.824884793,12.356575463,15.792670581,13.734117357,16.648540115,-2.34599667,-2.058162137,-3.313937806,-3.205378782,-1.262277622,-2.621960909,-2.647837599,-4.454342984,-3.700810066,-6.692880448,0,0,0.1541366421,0,0.1577847028,0.0794533609,0,0.0809880543,0,0,-0.681095807,-9.757213096,-7.24442218,-15.32327418,1.4989546763,-11.99745749,-2.246650084,-9.070662077,-13.40515646,-10.3739647,-0.681095807,-9.757213096,-7.090285538,-15.32327418,1.6567393791,-11.91800413,-2.246650084,-8.989674023,-13.40515646,-10.3739647 +050,3,6,01,037,Alabama,Coosa County,11539,11756,11779,11483,11343,11252,11037,10935,10812,10724,10619,10677,10650,23,-296,-140,-91,-215,-102,-123,-88,-105,58,-27,20,93,108,86,105,96,82,90,96,84,79,11,163,139,133,122,137,155,152,131,148,143,9,-70,-31,-47,-17,-41,-73,-62,-35,-64,-64,-1,0,-3,4,4,13,14,12,13,10,8,16,-228,-103,-47,-207,-72,-64,-38,-83,112,28,15,-228,-106,-43,-203,-59,-50,-26,-70,122,36,-1,2,-3,-1,5,-2,0,0,0,0,1,338,338,338,338,338,266,257,256,247,199,260,259,7.9958730978,9.462893192,7.612303607,9.4216878281,8.73839432,7.5412700602,8.3580980684,8.9959237221,7.8888054095,7.4084493834,14.014272204,12.179094016,11.772516043,10.947103953,12.470416894,14.254839748,14.11589896,12.275687579,13.899323817,13.410231162,-6.018399106,-2.716200824,-4.160212436,-1.525416125,-3.732022574,-6.713569688,-5.757800892,-3.279763857,-6.010518407,-6.001781779,0,-0.262858144,0.3540606329,0.3589214411,1.1833242308,1.2875339127,1.1144130758,1.218198004,0.9391435011,0.7502227224,-19.60278566,-9.024796285,-4.160212436,-18.57418458,-6.55379574,-5.885869315,-3.52897474,-7.777725718,10.518407213,2.6257795283,-19.60278566,-9.287654429,-3.806151803,-18.21526313,-5.370471509,-4.598335403,-2.414561664,-6.559527714,11.457550714,3.3760022507 +050,3,6,01,039,Alabama,Covington County,37765,37762,37810,38023,37809,37820,37766,37566,37400,37077,36993,37082,36930,48,213,-214,11,-54,-200,-166,-323,-84,89,-152,101,461,410,477,426,467,460,433,420,407,395,91,488,478,516,491,590,501,532,547,550,555,10,-27,-68,-39,-65,-123,-41,-99,-127,-143,-160,0,7,0,0,0,-2,-4,-2,-2,-2,-1,43,234,-141,56,19,-69,-120,-221,47,235,8,43,241,-141,56,19,-71,-124,-223,45,233,7,-5,-1,-5,-6,-8,-6,-1,-1,-2,-1,1,575,575,575,575,575,575,575,575,575,575,575,575,12.158295201,10.813376938,12.614208835,11.271928664,12.39844953,12.272230078,11.627750849,11.340623734,10.988862639,10.673944766,12.870386243,12.606815065,13.645559243,12.991823883,15.663994053,13.36605928,14.286289727,14.76981234,14.849814377,14.997567962,-0.712091042,-1.793438126,-1.031350408,-1.719895219,-3.265544523,-1.093829203,-2.658538878,-3.429188605,-3.860951738,-4.323623196,0.1846161961,0,0,0,-0.053098285,-0.106715044,-0.053707856,-0.05400297,-0.053999325,-0.027022645,6.1714556987,-3.718746703,1.4809134062,0.5027386024,-1.83189083,-3.201451325,-5.934718101,1.2690697988,6.3449206885,0.2161811598,6.3560718948,-3.718746703,1.4809134062,0.5027386024,-1.884989115,-3.308166369,-5.988425957,1.2150668287,6.2909213635,0.1891585148 +050,3,6,01,041,Alabama,Crenshaw County,13906,13891,13868,13894,13914,13847,13851,13851,13911,13871,13855,13811,13681,-23,26,20,-67,4,0,60,-40,-16,-44,-130,37,165,147,144,155,157,151,150,137,137,135,23,164,167,162,179,215,171,181,183,176,201,14,1,-20,-18,-24,-58,-20,-31,-46,-39,-66,8,15,15,2,-1,3,10,8,7,2,4,-47,10,28,-53,31,56,70,-16,23,-6,-66,-39,25,43,-51,30,59,80,-8,30,-4,-62,2,0,-3,2,-2,-1,0,-1,0,-1,-2,132,132,132,132,132,132,132,132,132,132,132,132,11.886751675,10.572497123,10.374266057,11.192143837,11.334921666,10.878178806,10.798358649,9.8824208324,9.9038531049,9.8210388477,11.814710756,12.010932106,11.671049314,12.925120947,15.522344957,12.31899719,13.030019437,13.200605929,12.723198149,14.622435618,0.0720409192,-1.438434983,-1.296783257,-1.73297711,-4.187423291,-1.440818385,-2.231660788,-3.318185097,-2.819345044,-4.80139677,1.0806137886,1.0788262371,0.1440870286,-0.07220738,0.2165908599,0.7204091924,0.5759124613,0.5049412104,0.1445817972,0.2909937436,0.7204091924,2.0138089758,-3.818306257,2.2384287674,4.0430293842,5.0428643469,-1.151824923,1.6590925485,-0.433745391,-4.80139677,1.8010229811,3.0926352129,-3.674219228,2.1662213878,4.259620244,5.7632735394,-0.575912461,2.1640337589,-0.289163594,-4.510403026 +050,3,6,01,043,Alabama,Cullman County,80406,80404,80456,80419,80292,80704,81081,81771,82434,82830,83300,83644,84515,52,-37,-127,412,377,690,663,396,470,344,871,249,998,925,952,1010,1012,1001,1013,940,998,948,228,910,963,960,947,973,970,1060,1078,1060,1115,21,88,-38,-8,63,39,31,-47,-138,-62,-167,1,29,22,37,42,41,41,9,14,2,3,41,-151,-94,389,284,611,595,434,597,405,1037,42,-122,-72,426,326,652,636,443,611,407,1040,-11,-3,-17,-6,-12,-1,-4,0,-3,-1,-2,1056,1056,1051,1049,1043,1032,990,1044,1049,1027,1040,1040,12.407148407,11.511346454,11.82638078,12.485706339,12.428462653,12.192076977,12.259173202,11.316438933,11.956105041,11.275043263,11.313131313,11.984245011,11.925762131,11.706894953,11.94950016,11.814500167,12.827960112,12.977788479,12.698869082,13.26125869,1.094017094,-0.472898557,-0.099381351,0.7788113855,0.4789624936,0.3775768095,-0.568786911,-1.661349546,-0.742764041,-1.986215427,0.3605283605,0.2737833751,0.4596387488,0.5192075903,0.5035246727,0.4993757803,0.1089166425,0.1685427075,0.0239601303,0.0356805167,-1.877233877,-1.169801694,4.8324181967,3.5108322774,7.5037457323,7.2470387625,5.2522025365,7.1871425992,4.8519263945,12.333565257,-1.516705517,-0.896018319,5.2920569455,4.0300398677,8.007270405,7.7464145428,5.361119179,7.3556853067,4.8758865248,12.369245773 +050,3,6,01,045,Alabama,Dale County,50251,50253,50396,50134,50313,49807,49465,49428,49476,49467,49268,49294,48959,143,-262,179,-506,-342,-37,48,-9,-199,26,-335,174,693,702,648,668,643,659,637,695,629,642,73,470,451,492,460,528,480,562,573,551,622,101,223,251,156,208,115,179,75,122,78,20,46,68,178,111,68,123,160,29,15,3,11,-1,-554,-245,-783,-631,-273,-289,-108,-335,-57,-364,45,-486,-67,-672,-563,-150,-129,-79,-320,-54,-353,-3,1,-5,10,13,-2,-2,-5,-1,2,-2,917,917,917,948,923,943,931,930,923,944,924,927,13.786929275,13.977520483,12.94446664,13.457974051,13.003953768,13.326053547,12.876100381,14.078087811,12.763539701,13.068303258,9.3504426539,8.9798600257,9.8282061526,9.2674671609,10.67820776,9.7063819461,11.360076003,11.606826353,11.180779611,12.661191007,4.4364866209,4.9976604578,3.1162604874,4.1905068902,2.3257460083,3.6196716007,1.5160243777,2.4712614574,1.5827600901,0.407112251,1.352830001,3.5441576155,2.217339193,1.3699734064,2.487537035,3.2354606487,0.5861960927,0.3038436218,0.0608753881,0.2239117381,-11.0215856,-4.878194471,-15.64123052,-12.71254734,-5.521118785,-5.844050797,-2.183075104,-6.785840887,-1.156632374,-7.409442969,-9.668755595,-1.334036855,-13.42389133,-11.34257394,-3.03358175,-2.608590148,-1.596879011,-6.481997265,-1.095756985,-7.185531231 +050,3,6,01,047,Alabama,Dallas County,43820,43813,43855,43254,42794,41981,41560,40947,40105,39263,38270,37182,36098,42,-601,-460,-813,-421,-613,-842,-842,-993,-1088,-1084,130,584,585,511,551,493,514,511,435,436,398,76,546,507,555,536,515,571,547,562,531,573,54,38,78,-44,15,-22,-57,-36,-127,-95,-175,0,-5,1,-4,-2,4,15,12,11,11,7,-7,-636,-554,-779,-438,-601,-803,-821,-880,-1002,-910,-7,-641,-553,-783,-440,-597,-788,-809,-869,-991,-903,-5,2,15,14,4,6,3,3,3,-2,-6,786,829,856,856,857,856,855,855,852,852,853,853,13.408488216,13.597062105,12.055440873,13.19112771,11.95050117,12.683215713,12.876726136,11.221028465,11.557016381,10.862445415,12.536018092,11.784120491,13.093482748,12.8320226,12.483789254,14.08972018,13.783892753,14.497052868,14.07517362,15.638646288,0.8724701236,1.812941614,-1.038041876,0.3591051101,-0.533288085,-1.406504466,-0.907166616,-3.276024403,-2.518157239,-4.776200873,-0.1147987,0.0232428412,-0.094367443,-0.047880681,0.0969614699,0.3701327543,0.3023888721,0.2837501451,0.2915761014,0.1910480349,-14.6023947,-12.87653403,-18.37805957,-10.48586921,-14.56846086,-19.81444011,-20.68843867,-22.70001161,-26.55993214,-24.83624454,-14.7171934,-12.85329119,-18.47242701,-10.5337499,-14.47149939,-19.44430736,-20.38604979,-22.41626146,-26.26835604,-24.64519651 +050,3,6,01,049,Alabama,DeKalb County,71109,71090,71133,71335,70913,70881,70963,71065,71116,71441,71430,71506,71658,43,202,-422,-32,82,102,51,325,-11,76,152,232,901,868,794,816,837,894,819,832,791,816,152,778,708,782,728,811,799,799,834,840,893,80,123,160,12,88,26,95,20,-2,-49,-77,11,86,59,68,38,33,88,66,85,34,39,-42,-3,-650,-99,-34,52,-128,244,-92,88,189,-31,83,-591,-31,4,85,-40,310,-7,122,228,-6,-4,9,-13,-10,-9,-4,-5,-2,3,1,782,782,782,782,782,782,782,782,781,781,781,781,12.64845439,12.204038018,11.199345529,11.505597699,11.786408314,12.575519936,11.490140786,11.646870254,11.067890524,11.399513844,10.921750849,9.9544457567,11.030085899,10.264797947,11.420283324,11.23919511,11.209551267,11.674867538,11.753512061,12.475203263,1.7267035404,2.2495922614,0.1692596302,1.2407997518,0.3661249894,1.3363248254,0.2805895186,-0.027997284,-0.685621537,-1.075689419,1.2072886543,0.8295371464,0.9591379043,0.5357998928,0.464697102,1.2378587856,0.9259454113,1.1898845812,0.475737393,0.5448297058,-0.04211472,-9.138968562,-1.396391949,-0.479399904,0.7322499789,-1.80052187,3.4231921267,-1.287875076,1.2313203112,2.6403285742,1.1651739338,-8.309431416,-0.437254045,0.0563999887,1.1969470809,-0.562663084,4.349137538,-0.097990495,1.7070577041,3.18515828 +050,3,6,01,051,Alabama,Elmore County,79303,79279,79558,80005,80211,80557,80563,80903,81258,81452,81189,81575,82158,279,447,206,346,6,340,355,194,-263,386,583,232,967,960,985,950,937,923,938,929,897,902,191,708,663,755,742,778,781,790,848,786,876,41,259,297,230,208,159,142,148,81,111,26,9,43,72,81,40,50,49,26,25,24,17,218,147,-156,46,-231,142,167,23,-371,251,537,227,190,-84,127,-191,192,216,49,-346,275,554,11,-2,-7,-11,-11,-11,-3,-3,2,0,3,5483,5483,5484,5503,5440,5419,5397,5311,5016,4147,4180,4172,12.120604401,11.983821841,12.253682325,11.79245283,11.606158572,11.38374825,11.529715445,11.423933694,11.022093338,11.01793774,8.8742377619,8.2763269586,9.3924164013,9.2105263158,9.6367037023,9.6324023656,9.7105279331,10.42787489,9.6581553661,10.700347517,3.2463666389,3.7074948819,2.8612659236,2.5819265144,1.9694548698,1.7513458846,1.8191875115,0.9960588044,1.3639379715,0.3175902231,0.5389720675,0.898786638,1.0076632166,0.4965243297,0.6193254307,0.6043376644,0.3195869953,0.3074255569,0.2949055074,0.2076551459,1.8425324167,-1.947371049,0.5722531847,-2.867428004,1.7588842233,2.0596814277,0.2827115727,-4.562195264,3.0842200978,6.559459608,2.3815044841,-1.048584411,1.5799164013,-2.370903674,2.378209654,2.6640190921,0.602298568,-4.254769708,3.3791256052,6.7671147539 +050,3,6,01,053,Alabama,Escambia County,38319,38325,38352,38211,38029,37775,37749,37676,37500,37010,36515,36569,36281,27,-141,-182,-254,-26,-73,-176,-490,-495,54,-288,123,484,445,440,447,400,450,460,447,421,434,62,442,482,446,467,472,512,499,505,452,503,61,42,-37,-6,-20,-72,-62,-39,-58,-31,-69,-2,4,-3,7,2,3,4,3,6,-1,1,-28,-186,-140,-255,-2,2,-118,-458,-446,87,-220,-30,-182,-143,-248,0,5,-114,-455,-440,86,-219,-4,-1,-2,0,-6,-6,0,4,3,-1,0,3199,3199,3199,3199,3124,3201,3198,3173,2683,2471,2394,2392,12.643182738,11.67366212,11.608886075,11.837296753,10.606562811,11.971905927,12.347335928,12.159129548,11.520989546,11.914893617,11.546047046,12.644281217,11.767189067,12.366929718,12.515744117,13.621368522,13.394175278,13.736824209,12.369328444,13.80919698,1.0971356922,-0.970619098,-0.158302992,-0.529632964,-1.909181306,-1.649462594,-1.04683935,-1.577694662,-0.848338898,-1.894303363,0.1044891135,-0.078698846,0.1846868239,0.0529632964,0.0795492211,0.1064169416,0.0805261039,0.1632097926,-0.027365771,0.0274536719,-4.85874378,-3.672612802,-6.727877157,-0.052963296,0.0530328141,-3.139299777,-12.29365186,-12.13192792,2.3808220678,-6.039807824,-4.754254666,-3.751311647,-6.543190333,0,0.1325820351,-3.032882835,-12.21312575,-11.96871812,2.3534562969,-6.012354152 +050,3,6,01,055,Alabama,Etowah County,104430,104412,104440,104356,104271,103891,103417,103033,102931,103076,102766,102460,102371,28,-84,-85,-380,-474,-384,-102,145,-310,-306,-89,259,1252,1156,1148,1205,1159,1237,1210,1193,1182,1173,287,1355,1408,1347,1386,1379,1409,1379,1455,1500,1609,-28,-103,-252,-199,-181,-220,-172,-169,-262,-318,-436,10,38,25,4,26,51,82,41,48,36,29,60,-15,161,-169,-306,-204,-5,278,-92,-26,317,70,23,186,-165,-280,-153,77,319,-44,10,346,-14,-4,-19,-16,-13,-11,-7,-5,-4,2,1,2085,2085,2085,2085,2084,2085,2085,2085,2085,2086,2083,2085,11.992566907,11.081978843,11.029870966,11.625214656,11.227900218,12.011807889,11.74717364,11.591414774,11.519008313,11.453344464,12.979175846,13.497773538,12.941843372,13.371408725,13.359166868,13.68200268,13.387894586,14.137056577,14.618030854,15.710512569,-0.986608939,-2.415794696,-1.911972406,-1.746194069,-2.131266651,-1.670194791,-1.640720946,-2.545641803,-3.099022541,-4.257168104,0.3639916473,0.2396621722,0.0384316062,0.2508345071,0.4940663599,0.7962556563,0.3980447266,0.4663771242,0.3508327405,0.2831602638,-0.143680913,1.543424389,-1.62373536,-2.952129199,-1.97626544,-0.048552174,2.6989374147,-0.893889488,-0.253379201,3.095234608,0.2203107339,1.7830865612,-1.585303754,-2.701294692,-1.48219908,0.7477034822,3.0969821414,-0.427512364,0.097453539,3.3783948719 +050,3,6,01,057,Alabama,Fayette County,17241,17237,17232,17061,16955,16837,16784,16711,16581,16478,16451,16279,16241,-5,-171,-106,-118,-53,-73,-130,-103,-27,-172,-38,40,189,163,188,181,192,175,155,194,154,160,39,255,255,237,218,230,222,256,233,228,247,1,-66,-92,-49,-37,-38,-47,-101,-39,-74,-87,0,-3,-1,0,4,6,6,4,3,1,3,-3,-101,-11,-70,-18,-39,-89,-5,9,-98,47,-3,-104,-12,-70,-14,-33,-83,-1,12,-97,50,-3,-1,-2,1,-2,-2,0,-1,0,-1,-1,291,291,291,291,291,291,291,291,291,291,291,291,11.022657685,9.5837253057,11.126893939,10.767080099,11.464397671,10.513036165,9.3771741432,11.782926903,9.4103269172,9.840098401,14.871839734,14.992944497,14.026988636,12.968085423,13.733393044,13.336537306,15.487461811,14.151659631,13.932172319,15.190651907,-3.849182049,-5.409219191,-2.900094697,-2.201005324,-2.268995372,-2.823501141,-6.110287668,-2.368732728,-4.521845402,-5.350553506,-0.17496282,-0.058795861,0,0.2379465215,0.3582624272,0.3604469542,0.2419915908,0.1822102098,0.0611060189,0.184501845,-5.890414953,-0.646754468,-4.142992424,-1.070759347,-2.328705777,-5.346629821,-0.302489488,0.5466306295,-5.988389856,2.8905289053,-6.065377774,-0.705550329,-4.142992424,-0.832812825,-1.97044335,-4.986182867,-0.060497898,0.7288408394,-5.927283837,3.0750307503 +050,3,6,01,059,Alabama,Franklin County,31704,31708,31746,31776,31699,31566,31572,31532,31674,31670,31495,31587,31507,38,30,-77,-133,6,-40,142,-4,-175,92,-80,120,419,406,433,411,404,418,450,436,435,428,65,419,381,410,405,376,390,344,366,391,416,55,0,25,23,6,28,28,106,70,44,12,-1,68,91,114,52,34,100,82,97,66,52,-15,-35,-196,-271,-46,-103,17,-192,-341,-19,-144,-16,33,-105,-157,6,-69,117,-110,-244,47,-92,-1,-3,3,1,-6,1,-3,0,-1,1,0,272,272,272,272,272,272,272,272,272,272,272,272,13.19227984,12.792437968,13.688453331,13.019101017,12.804259635,13.226592412,14.208133367,13.805113591,13.791572873,13.567058674,13.19227984,12.00472627,12.961353039,12.829041148,11.9168357,12.340600576,10.861328618,11.588696272,12.396563203,13.186673852,0,0.7877116975,0.7271002924,0.1900598689,0.8874239351,0.8859918362,3.3468047487,2.2164173197,1.39500967,0.3803848226,2.140990523,2.867270579,3.6038884059,1.6471855301,1.0775862069,3.1642565579,2.5890376358,3.071321143,2.0925145049,1.6483342315,-1.101980416,-6.175659709,-8.567138228,-1.457125661,-3.264452333,0.5379236148,-6.062136903,-10.79711866,-0.602390539,-4.564617872,1.0390101067,-3.30838913,-4.963249822,0.1900598689,-2.186866126,3.7021801728,-3.473099267,-7.725797514,1.4901239656,-2.91628364 +050,3,6,01,061,Alabama,Geneva County,26790,26783,26778,26758,26928,26688,26605,26645,26497,26404,26296,26309,26411,-5,-20,170,-240,-83,40,-148,-93,-108,13,102,74,319,306,325,276,299,273,302,271,289,264,117,332,349,361,322,355,372,382,388,353,379,-43,-13,-43,-36,-46,-56,-99,-80,-117,-64,-115,-1,-10,-7,-2,-3,-4,-4,-4,-4,-4,-3,40,5,222,-205,-29,104,-44,-9,15,83,219,39,-5,215,-207,-32,100,-48,-13,11,79,216,-1,-2,-2,3,-5,-4,-1,0,-2,-2,1,229,229,229,229,229,229,229,229,229,229,229,229,11.917214585,11.399620013,12.123246792,10.357833111,11.230046948,10.274359264,11.417553543,10.284629981,10.987548712,10.015174507,12.402869097,13.0015274,13.466129514,12.08413863,13.333333333,14.00022581,14.442071038,14.724857685,13.420777493,14.37784522,-0.485654513,-1.601907387,-1.342882722,-1.726305519,-2.103286385,-3.725866546,-3.024517495,-4.440227704,-2.433228781,-4.362670713,-0.373580395,-0.260775621,-0.074604596,-0.112585143,-0.150234742,-0.150540062,-0.151225875,-0.151802657,-0.152076799,-0.113808801,0.1867901973,8.2703125582,-7.646971053,-1.088323044,3.9061032864,-1.655940687,-0.340258218,0.569259962,3.1555935748,8.3080424886,-0.186790197,8.009536937,-7.721575649,-1.200908187,3.7558685446,-1.80648075,-0.491484093,0.4174573055,3.003516776,8.1942336874 +050,3,6,01,063,Alabama,Greene County,9045,9039,8990,8903,8849,8749,8585,8509,8485,8312,8212,8104,7990,-49,-87,-54,-100,-164,-76,-24,-173,-100,-108,-114,37,106,107,104,102,97,96,98,112,74,83,37,106,102,134,96,113,105,118,125,92,91,0,0,5,-30,6,-16,-9,-20,-13,-18,-8,0,0,0,0,0,1,1,1,1,1,0,-53,-88,-59,-71,-175,-62,-15,-154,-88,-91,-104,-53,-88,-59,-71,-175,-61,-14,-153,-87,-90,-104,4,1,0,1,5,1,-1,0,0,0,-2,45,45,45,45,45,45,45,45,45,45,45,45,11.848208797,12.054979721,11.819524946,11.768778124,11.349011349,11.298105214,11.668750372,13.5560397,9.0708506987,10.314402883,11.848208797,11.491662911,15.229003296,11.076497058,13.221013221,12.357302577,14.050127999,15.129508594,11.277273842,11.308562197,0,0.5633168094,-3.40947835,0.6922810661,-1.872001872,-1.059197364,-2.381377627,-1.573468894,-2.206423143,-0.994159314,0,0,0,0,0.117000117,0.117688596,0.1190688813,0.1210360687,0.1225790635,0,-9.836248812,-6.647138351,-8.069098761,-20.19153109,-7.254007254,-1.76532894,-18.33660773,-10.65117405,-11.15469478,-12.92407108,-9.836248812,-6.647138351,-8.069098761,-20.19153109,-7.137007137,-1.647640344,-18.21753885,-10.53013798,-11.03211571,-12.92407108 +050,3,6,01,065,Alabama,Hale County,15760,15762,15745,15360,15366,15249,15047,15016,14845,14812,14773,14669,14670,-17,-385,6,-117,-202,-31,-171,-33,-39,-104,1,55,188,203,203,188,212,204,184,215,167,178,27,205,153,183,182,179,185,195,203,170,203,28,-17,50,20,6,33,19,-11,12,-3,-25,8,9,-1,-1,-2,-3,0,2,2,2,2,-55,-381,-42,-140,-209,-62,-191,-24,-53,-103,25,-47,-372,-43,-141,-211,-65,-191,-22,-51,-101,27,2,4,-1,4,3,1,1,0,0,0,-1,334,334,334,315,273,221,221,221,221,221,221,221,12.088088732,13.213565059,13.261473134,12.410879324,14.103715531,13.663306654,12.408537613,14.534392429,11.344338021,12.134019564,13.181160585,9.9589923843,11.954924057,12.014787431,11.908325849,12.39074378,13.150352362,13.723170526,11.548128524,13.838235795,-1.093071853,3.2545726746,1.3065490772,0.3960918933,2.1953896817,1.2725628747,-0.741814749,0.811221903,-0.203790503,-1.704216231,0.5786850989,-0.065091453,-0.065327454,-0.132030631,-0.19958088,0,0.1348754088,0.1352036505,0.1358603356,0.1363372985,-24.49766919,-2.733841047,-9.145843541,-13.79720095,-4.124671523,-12.79260574,-1.618504906,-3.582896738,-6.996807282,1.704216231,-23.91898409,-2.7989325,-9.211170995,-13.92923158,-4.324252403,-12.79260574,-1.483629497,-3.447693088,-6.860946947,1.8405535294 +050,3,6,01,067,Alabama,Henry County,17302,17296,17293,17377,17152,17128,17074,17097,17062,17105,17100,17125,17223,-3,84,-225,-24,-54,23,-35,43,-5,25,98,40,190,182,170,170,162,174,200,168,155,149,59,228,234,211,190,211,230,232,226,208,229,-19,-38,-52,-41,-20,-49,-56,-32,-58,-53,-80,5,17,0,8,1,2,1,-2,0,-2,-2,13,106,-174,10,-31,71,22,79,54,79,182,18,123,-174,18,-30,73,23,77,54,77,180,-2,-1,1,-1,-4,-1,-2,-2,-1,1,-2,199,199,199,199,199,199,199,199,199,199,199,199,10.960484569,10.541863361,9.91831972,9.9409391264,9.4817242691,10.187651863,11.707202857,9.8231252741,9.057706355,8.6759054385,13.152581483,13.553824322,12.310385064,11.110461377,12.349653215,13.466436371,13.580355314,13.214442333,12.15485756,13.334109701,-2.192096914,-3.01196096,-2.392065344,-1.16952225,-2.867928946,-3.278784508,-1.873152457,-3.391317059,-3.097151205,-4.658204262,0.9806749351,0,0.4667444574,0.0584761125,0.1170583243,0.0585497234,-0.117072029,0,-0.11687363,-0.116455107,6.1147966542,-10.07848475,0.5834305718,-1.812759488,4.155570513,1.2880939138,4.6243451283,3.1574331238,4.6165084003,10.597414697,7.0954715893,-10.07848475,1.0501750292,-1.754283375,4.2726288373,1.3466436371,4.5072730998,3.1574331238,4.4996347699,10.48095959 +050,3,6,01,069,Alabama,Houston County,101547,101562,101800,102509,103410,103691,104216,104326,104355,104472,104943,106240,106580,238,709,901,281,525,110,29,117,471,1297,340,322,1333,1335,1254,1286,1270,1371,1281,1338,1353,1376,231,914,1006,1095,1060,1092,1075,1162,1147,1177,1253,91,419,329,159,226,178,296,119,191,176,123,6,43,55,42,35,35,50,28,32,15,14,144,252,521,98,281,-90,-311,-24,252,1109,198,150,295,576,140,316,-55,-261,4,284,1124,212,-3,-5,-4,-18,-17,-13,-6,-6,-4,-3,5,1416,1415,1415,1415,1416,1417,1417,1415,1415,1415,1418,1418,13.048862263,12.966263434,12.110033269,12.370915842,12.179800712,13.139672515,12.268528495,12.778454265,12.813531392,12.931115497,8.947231889,9.7708322204,10.574550582,10.196866868,10.472710533,10.302806676,11.128829127,10.954325144,11.146730561,11.775209097,4.1016303736,3.1954312132,1.5354826872,2.1740489738,1.7070901785,2.8368658383,1.1396993684,1.8241291216,1.6668008315,1.1559063998,0.4209310407,0.5341906284,0.4055992004,0.3366890004,0.3356637991,0.4792003105,0.2681645573,0.305613256,0.142056889,0.1315665821,2.4668516805,5.060242134,0.9463981342,2.7031316887,-0.863135483,-2.980625931,-0.229855335,2.4067043908,10.50273933,1.8607273752,2.8877827213,5.5944327624,1.3519973346,3.0398206891,-0.527471684,-2.501425621,0.0383092225,2.7123176468,10.644796219,1.9922939573 +050,3,6,01,071,Alabama,Jackson County,53227,53248,53207,53240,53107,52986,52592,52229,52058,51865,51649,51672,51582,-41,33,-133,-121,-394,-363,-171,-193,-216,23,-90,143,573,599,556,553,526,592,561,585,558,559,130,647,692,691,645,722,738,716,726,692,736,13,-74,-93,-135,-92,-196,-146,-155,-141,-134,-177,7,35,72,53,14,2,-4,-6,-6,-9,-7,-57,74,-105,-28,-313,-164,-16,-29,-68,167,91,-50,109,-33,25,-299,-162,-20,-35,-74,158,84,-4,-2,-7,-11,-3,-5,-5,-3,-1,-1,3,597,597,597,597,597,597,597,597,597,597,597,597,10.765921069,11.265009826,10.481370119,10.475667279,10.036156877,11.353284686,10.796455068,11.302818942,10.801289186,10.827667693,12.156284348,13.014001335,13.026307108,12.218454602,13.775865523,14.153250165,13.779432849,14.027088123,13.395147163,14.256106301,-1.390363279,-1.748991509,-2.544936989,-1.742787323,-3.739708646,-2.79996548,-2.982977782,-2.724269181,-2.593857977,-3.428438608,0.6576042538,1.3540579424,0.9991234106,0.2652067666,0.0381602923,-0.076711383,-0.115470108,-0.115926348,-0.174214342,-0.135587968,1.3903632794,-1.974667833,-0.527838783,-5.929265567,-3.129143969,-0.306845532,-0.55810552,-1.313831945,3.2326438962,1.762643578,2.0479675331,-0.62060989,0.4712846276,-5.6640588,-3.090983677,-0.383556915,-0.673575628,-1.429758294,3.0584295545,1.6270556104 +050,3,6,01,073,Alabama,Jefferson County,658466,658564,658230,658175,658183,659434,660185,660717,660507,659892,659672,658539,655342,-334,-55,8,1251,751,532,-210,-615,-220,-1133,-3197,2109,8828,9009,8840,8658,8992,8626,8624,8663,8399,8257,1585,6896,6738,7057,6853,7211,7017,7204,7433,7356,7768,524,1932,2271,1783,1805,1781,1609,1420,1230,1043,489,114,830,726,807,570,720,844,446,502,337,252,-968,-2813,-2918,-1226,-1490,-1899,-2634,-2446,-1933,-2522,-3949,-854,-1983,-2192,-419,-920,-1179,-1790,-2000,-1431,-2185,-3697,-4,-4,-71,-113,-134,-70,-29,-35,-19,9,11,15774,15775,15754,15808,16012,16026,16360,16617,16696,16658,16627,16627,13.412285733,13.68776579,13.418163245,13.121969296,13.614938883,13.057589024,13.062718163,13.130094486,12.743028241,12.568870392,10.477018851,10.237336652,10.711762219,10.386331206,10.91829674,10.62196872,10.91185316,11.265842354,11.160580514,11.824510743,2.9352668822,3.4504291386,2.7064010255,2.7356380895,2.696642143,2.4356203036,2.1508650037,1.8642521318,1.5824477265,0.744359649,1.2610100995,1.103043397,1.2249386582,0.8638857125,1.0901641454,1.2776031922,0.6755533744,0.7608573741,0.5112990257,0.3835963835,-4.273760735,-4.433444397,-1.86093531,-2.258227564,-2.875307934,-3.987211858,-3.704940704,-2.929755586,-3.82639805,-6.011198883,-3.012750635,-3.330401,-0.635996652,-1.394341852,-1.785143788,-2.709608666,-3.029387329,-2.168898212,-3.315099024,-5.6276025 +050,3,6,01,075,Alabama,Lamar County,14564,14564,14496,14292,14250,14214,14071,13931,13926,13885,13878,13817,13764,-68,-204,-42,-36,-143,-140,-5,-41,-7,-61,-53,33,141,142,142,142,163,150,140,160,182,175,71,199,173,198,204,186,218,209,182,174,223,-38,-58,-31,-56,-62,-23,-68,-69,-22,8,-48,0,2,1,4,0,1,-1,0,0,0,0,-28,-148,-8,18,-80,-117,65,29,15,-69,-5,-28,-146,-7,22,-80,-116,64,29,15,-69,-5,-2,0,-4,-2,-1,-1,-1,-1,0,0,0,217,217,217,217,217,217,217,217,217,217,217,217,9.7957482284,9.9502487562,9.9775154581,10.040657592,11.64202557,10.769285996,10.067958721,11.526131902,13.143166637,12.689895218,13.825204947,12.122486161,13.912310287,14.424606682,13.284765374,15.651362315,15.030024091,13.110975039,12.565445026,16.170552192,-4.029456718,-2.172237405,-3.934794829,-4.38394909,-1.642739804,-4.882076318,-4.96206537,-1.584843137,0.5777216104,-3.480656974,0.1389467834,0.0700721743,0.2810567735,0,0.0714234698,-0.07179524,0,0,0,0,-10.28206197,-0.560577395,1.2647554806,-5.656708503,-8.356545961,4.6666905984,2.0855057351,1.0805748658,-4.98284889,-0.362568435,-10.14311519,-0.49050522,1.5458122541,-5.656708503,-8.285122491,4.5948953584,2.0855057351,1.0805748658,-4.98284889,-0.362568435 +050,3,6,01,077,Alabama,Lauderdale County,92709,92709,92738,92615,92687,92738,93049,92524,92521,92701,92733,93028,93368,29,-123,72,51,311,-525,-3,180,32,295,340,239,950,895,942,939,953,925,894,935,885,916,227,1100,1021,1124,1090,1099,1128,1157,1126,1127,1217,12,-150,-126,-182,-151,-146,-203,-263,-191,-242,-301,17,49,54,25,31,57,106,55,60,40,32,15,-18,155,220,440,-430,100,392,166,498,608,32,31,209,245,471,-373,206,447,226,538,640,-15,-4,-11,-12,-9,-6,-6,-4,-3,-1,1,1891,1891,1863,2084,2043,2072,2048,2110,2089,2281,2414,2411,10.250710806,9.659906531,10.160442227,10.108349885,10.270890701,9.9975681591,9.6532809278,10.084450532,9.5283724786,9.8285370931,11.869244091,11.019848679,12.123500067,11.733867278,11.844395467,12.191629063,12.493116368,12.144482673,12.133870942,13.058220133,-1.618533285,-1.359942148,-1.96305784,-1.625517394,-1.573504766,-2.194060904,-2.839835441,-2.060032141,-2.605498463,-3.22968304,0.5287208731,0.5828323494,0.2696508022,0.3337154914,0.6143135047,1.1456672701,0.5938819363,0.6471305154,0.430660903,0.3433550076,-0.194223994,1.6729447065,2.3729270595,4.7366069747,-4.63429486,1.0808181794,4.2327585276,1.790394426,5.3617282422,6.5237451447,0.3344968789,2.2557770558,2.6425778617,5.070322466,-4.019981355,2.2264854495,4.8266404639,2.4375249415,5.7923891452,6.8671001524 +050,3,6,01,079,Alabama,Lawrence County,34339,34308,34314,34026,33782,33553,33423,33116,33196,33035,32905,32851,32857,6,-288,-244,-229,-130,-307,80,-161,-130,-54,6,79,345,375,373,355,371,361,396,372,319,332,60,421,388,391,413,411,395,407,429,418,476,19,-76,-13,-18,-58,-40,-34,-11,-57,-99,-144,1,3,2,-1,-2,-1,-5,-6,-6,-7,-3,-10,-215,-236,-210,-64,-266,121,-144,-66,52,153,-9,-212,-234,-211,-66,-267,116,-150,-72,45,150,-4,0,3,0,-6,0,-2,0,-1,0,0,229,229,229,229,229,229,229,229,229,229,229,229,10.096575944,11.060641812,11.07893369,10.600812231,11.151354845,10.887923754,11.958146487,11.282984531,9.7025366506,10.105314421,12.320749195,11.444077395,11.613573921,12.33277592,12.353657254,11.913379177,12.290317223,13.011828935,12.713668715,14.488342363,-2.224173251,-0.383435583,-0.534640232,-1.731963688,-1.202302409,-1.025455423,-0.332170736,-1.728844404,-3.011132064,-4.383027942,0.0877963126,0.0589900897,-0.029702235,-0.059722886,-0.03005756,-0.150802268,-0.181184038,-0.181983621,-0.212908328,-0.091313082,-6.292069066,-6.96083058,-6.23746937,-1.911132346,-7.995311021,3.6494148872,-4.348416904,-2.001819836,1.5816047205,4.6569671882,-6.204272754,-6.901840491,-6.267171605,-1.970855232,-8.025368581,3.4986126191,-4.529600942,-2.183803458,1.3686963927,4.565654106 +050,3,6,01,081,Alabama,Lee County,140247,140300,140815,144194,148670,151943,154682,157162,159446,161808,164206,165015,166831,515,3379,4476,3273,2739,2480,2284,2362,2398,809,1816,415,1630,1663,1829,1829,1913,1937,1889,1876,1791,1754,238,807,883,1040,1117,1094,982,1103,1076,1202,1272,177,823,780,789,712,819,955,786,800,589,482,115,521,868,652,513,538,596,392,393,299,242,216,2020,2740,1795,1486,1121,733,1179,1210,-84,1082,331,2541,3608,2447,1999,1659,1329,1571,1603,215,1324,7,15,88,37,28,2,0,5,-5,5,10,4410,4410,4312,4208,4552,4941,4954,4895,4953,4912,4960,4960,11.438235284,11.356807255,12.168469095,11.929881777,12.26895499,12.235951081,11.760164854,11.508708215,10.88022939,10.571168554,5.6629790638,6.0301027098,6.9191951113,7.2857725234,7.0163286772,6.2032544977,6.8668405685,6.6009435178,7.3020858329,7.6662066139,5.77525622,5.3267045455,5.2492739835,4.644109254,5.2526263132,6.0326965838,4.8933242855,4.9077646972,3.5781435571,2.9049619402,3.6560248975,5.9276660839,4.337803089,3.346106808,3.4504431703,3.7649080251,2.4404365393,2.4109394075,1.8164090383,1.4585078621,14.174990965,18.711756993,11.942264639,9.6926212801,7.189492182,4.630331514,7.3399864282,7.4229941045,-0.510295516,6.5210971354,17.831015863,24.639423077,16.280067728,13.038728088,10.639935352,8.3952395391,9.7804229675,9.8339335121,1.3061135225,7.9796049975 +050,3,6,01,083,Alabama,Limestone County,82782,82775,83168,85553,87336,88931,90622,91596,92896,94144,96199,99136,102228,393,2385,1783,1595,1691,974,1300,1248,2055,2937,3092,222,1012,1004,977,1008,1027,1045,980,1030,1004,1037,155,684,716,672,728,754,771,767,915,870,931,67,328,288,305,280,273,274,213,115,134,106,9,83,66,76,50,44,85,35,40,15,24,295,1957,1405,1190,1339,659,939,999,1896,2792,2978,304,2040,1471,1266,1389,703,1024,1034,1936,2807,3002,22,17,24,24,22,-2,2,1,4,-4,-16,2907,2907,2953,2760,2905,2798,2732,2837,2698,2644,2732,2734,11.996135632,11.614388423,11.085455587,11.227882575,11.272212405,11.328404484,10.479041916,10.82256768,10.27977577,10.299755666,8.1080600518,8.2827710265,7.6247964735,8.1090263042,8.2758015125,8.3580859875,8.2014542344,9.6142227453,8.9077738245,9.2469358972,3.8880755804,3.3316173961,3.4606591137,3.1188562709,2.9964108924,2.9703184962,2.2775876818,1.2083449352,1.3720019454,1.0528197692,0.9838727841,0.7634956533,0.8623281726,0.5569386198,0.4829380193,0.9214491685,0.374251497,0.4202938905,0.1535823073,0.2383742874,23.198060704,16.253202922,13.502243755,14.914816238,7.2330944254,10.179303168,10.682207015,19.92193041,28.586786802,29.578276157,24.181933488,17.016698575,14.364571928,15.471754858,7.7160324447,11.100752336,11.056458512,20.3422243,28.740369109,29.816650444 +050,3,6,01,085,Alabama,Lowndes County,11299,11302,11294,11144,10857,10666,10497,10350,10245,10100,9969,9726,9641,-8,-150,-287,-191,-169,-147,-105,-145,-131,-243,-85,36,148,147,139,118,127,120,129,117,120,110,18,157,115,142,109,146,128,144,138,144,161,18,-9,32,-3,9,-19,-8,-15,-21,-24,-51,0,3,0,0,-1,-1,-1,0,0,0,0,-26,-145,-329,-193,-181,-127,-97,-129,-110,-218,-34,-26,-142,-329,-193,-182,-128,-98,-129,-110,-218,-34,0,1,10,5,4,0,1,-1,0,-1,0,96,96,96,96,96,96,96,96,96,96,96,96,13.191906587,13.363028953,12.916414998,11.151538062,12.184007291,11.653313911,12.681248464,11.65977378,12.185833968,11.359529096,13.994117123,10.45407027,13.195186545,10.300997023,14.006811532,12.430201505,14.155812239,13.75255369,14.623000762,16.626219859,-0.802210536,2.9089586837,-0.278771547,0.8505410386,-1.82280424,-0.776887594,-1.474563775,-2.092779909,-2.437166794,-5.266690763,0.2674035119,0,0,-0.09450456,-0.095937065,-0.097110949,0,0,0,0,-12.92450308,-29.90773147,-17.93430284,-17.10532533,-12.18400729,-9.419762078,-12.68124846,-10.96218048,-22.13759838,-3.511127175,-12.65709956,-29.90773147,-17.93430284,-17.19982989,-12.27994436,-9.516873027,-12.68124846,-10.96218048,-22.13759838,-3.511127175 +050,3,6,01,087,Alabama,Macon County,21452,21459,21515,21299,20625,20043,19670,19331,19077,18828,18320,18065,17895,56,-216,-674,-582,-373,-339,-254,-249,-508,-255,-170,65,218,210,178,202,186,177,179,181,189,170,40,238,225,227,234,240,258,238,249,269,283,25,-20,-15,-49,-32,-54,-81,-59,-68,-80,-113,-3,-8,9,9,11,6,4,4,2,2,1,31,-189,-692,-560,-363,-292,-178,-194,-444,-177,-59,28,-197,-683,-551,-352,-286,-174,-190,-442,-175,-58,3,1,24,18,11,1,1,0,2,0,1,1772,1774,1850,1729,1816,1726,1670,1680,1732,1597,1582,1582,10.183584809,10.018128041,8.7538113504,10.172991212,9.5382169688,9.2168298271,9.4446642923,9.7448045655,10.388896523,9.4549499444,11.117858644,10.733708616,11.163568408,11.784554176,12.307376734,13.434701104,12.557710065,13.405836115,14.786313041,15.73971079,-0.934273836,-0.715580574,-2.409757057,-1.611562964,-2.769159765,-4.217871277,-3.113045772,-3.661031549,-4.397416518,-6.284760845,-0.373709534,0.4293483446,0.4426084391,0.553974769,0.3076844183,0.2082899396,0.2110539507,0.1076773985,0.1099354129,0.0556173526,-8.828887747,-33.01211716,-27.54008065,-18.28116738,-14.97397503,-9.268902312,-10.23611661,-23.90438247,-9.729284046,-3.281423804,-9.202597281,-32.58276882,-27.09747221,-17.72719261,-14.66629061,-9.060612372,-10.02506266,-23.79670507,-9.619348633,-3.225806452 +050,3,6,01,089,Alabama,Madison County,334811,334812,336114,339623,342823,346764,349973,353194,356985,362061,367386,372547,379453,1302,3509,3200,3941,3209,3221,3791,5076,5325,5161,6906,964,4252,4035,3999,4190,4208,4191,4242,4324,4227,4315,600,2717,2576,2892,2701,3042,3109,3258,3362,3266,3585,364,1535,1459,1107,1489,1166,1082,984,962,961,730,118,553,681,504,449,577,647,398,483,178,214,788,1423,1095,2323,1316,1508,2067,3690,3871,4023,5986,906,1976,1776,2827,1765,2085,2714,4088,4354,4201,6200,32,-2,-35,7,-45,-30,-5,4,9,-1,-24,8042,8046,7570,7531,7654,7775,8080,8100,8519,8936,8184,8186,12.584777806,11.825111437,11.598246487,12.027493875,11.968707291,11.802658203,11.798966965,11.855556332,11.425358782,11.47606383,8.0415901453,7.5493152572,8.3876291171,7.7532842378,8.6522831703,8.7555390965,9.0620071595,9.2179418107,8.8278263032,9.5345744681,4.5431876603,4.2757961802,3.2106173695,4.2742096372,3.3164241212,3.0471191066,2.7369598051,2.6376145217,2.5975324793,1.9414893617,1.6367314503,1.9957623021,1.4617444934,1.2888650954,1.6411464133,1.8220758429,1.1070223602,1.3242908669,0.4811246424,0.5691489362,4.2116977463,3.2090451113,6.7373659886,3.7776090548,4.289166016,5.8210676463,10.263599269,10.613519557,10.873957507,15.920212766,5.8484291966,5.2048074133,8.1991104821,5.0664741502,5.9303124293,7.6431434892,11.370621629,11.937810424,11.355082149,16.489361702 +050,3,6,01,091,Alabama,Marengo County,21027,21047,20955,20663,20378,20123,19990,19772,19536,19411,19093,18919,18733,-92,-292,-285,-255,-133,-218,-236,-125,-318,-174,-186,48,234,253,234,257,256,249,237,207,202,190,100,248,227,271,253,273,249,268,295,269,259,-52,-14,26,-37,4,-17,0,-31,-88,-67,-69,1,13,18,16,3,5,13,8,8,3,6,-41,-292,-339,-236,-140,-208,-249,-103,-238,-110,-122,-40,-279,-321,-220,-137,-203,-236,-95,-230,-107,-116,0,1,10,2,0,2,0,1,0,0,-1,254,254,254,254,254,254,254,254,254,254,254,254,11.245134317,12.32913428,11.55527024,12.813801012,12.876615864,12.669176758,12.170385396,10.752129649,10.628222667,10.092425369,11.917920131,11.062108623,13.38238562,12.614364421,13.731703637,12.669176758,13.762292346,15.323083316,14.153425234,13.757569319,-0.672785814,1.2670256573,-1.82711538,0.1994365916,-0.855087772,0,-1.59190695,-4.570953667,-3.525202568,-3.66514395,0.6247296843,0.8771716089,0.7901039481,0.1495774437,0.2514964036,0.6614429633,0.4108146969,0.4155412425,0.1578448911,0.3187081696,-14.03238983,-16.5200653,-11.65403323,-6.980280707,-10.46225039,-12.66917676,-5.289239223,-12.36235196,-5.787646007,-6.480399448,-13.40766015,-15.64289369,-10.86392929,-6.830703263,-10.21075399,-12.00773379,-4.878424526,-11.94681072,-5.629801115,-6.161691278 +050,3,6,01,093,Alabama,Marion County,30776,30780,30822,30661,30495,30236,30215,30137,29958,29825,29776,29826,29703,42,-161,-166,-259,-21,-78,-179,-133,-49,50,-123,75,288,325,302,313,317,281,299,296,330,312,77,426,412,418,372,403,412,383,448,417,448,-2,-138,-87,-116,-59,-86,-131,-84,-152,-87,-136,2,13,18,10,1,6,15,13,14,11,8,43,-35,-92,-154,45,7,-62,-60,92,127,4,45,-22,-74,-144,46,13,-47,-47,106,138,12,-1,-1,-5,1,-8,-5,-1,-2,-3,-1,1,868,868,868,862,868,868,868,808,750,736,815,813,9.3684433095,10.628556479,9.9454973572,10.355494533,10.505037116,9.3518595557,10.002843618,9.9327192497,11.073453911,10.482285945,13.857489062,13.47373929,13.76562217,12.30748871,13.354984093,13.711623263,12.813007042,15.03330481,13.992819033,15.05148751,-4.489045752,-2.845182811,-3.820124813,-1.951994177,-2.849946978,-4.359763707,-2.810163424,-5.100585561,-2.919365122,-4.569201566,0.4228811216,0.5886585127,0.3293211045,0.0330846471,0.1988335101,0.4992095848,0.4349062443,0.4697907753,0.3691151304,0.2687765627,-1.138526097,-3.008699065,-5.07154501,1.4888091181,0.2319724284,-2.063399617,-2.007259589,3.0871965235,4.2616019597,0.1343882813,-0.715644975,-2.420040552,-4.742223905,1.5218937652,0.4308059385,-1.564190032,-1.572353345,3.5569872989,4.63071709,0.403164844 +050,3,6,01,095,Alabama,Marshall County,93019,93017,93119,93899,94264,94358,94262,94588,95123,95589,96230,96751,96990,102,780,365,94,-96,326,535,466,641,521,239,321,1311,1292,1210,1299,1328,1371,1373,1436,1376,1371,269,1016,1053,1105,1096,1071,1147,1197,1124,1196,1263,52,295,239,105,203,257,224,176,312,180,108,17,170,150,110,20,63,112,69,89,26,32,39,319,-2,-104,-305,19,205,228,241,316,94,56,489,148,6,-285,82,317,297,330,342,126,-6,-4,-22,-17,-14,-13,-6,-7,-1,-1,5,1047,1047,1035,1061,1059,1065,1060,1062,1046,1045,1044,1044,14.020040852,13.732774244,12.829892589,13.77372495,14.064072015,14.453563578,14.398674441,14.972447985,14.260471238,14.15291549,10.865264306,11.19242359,11.716554803,11.621249072,11.342335187,12.092076896,12.552959436,11.719381292,12.395002617,13.038024992,3.1547765456,2.5403506534,1.1133377867,2.1524758774,2.7217368282,2.3614866824,1.8457150048,3.2530666931,1.8654686213,1.1148904981,1.8180068229,1.5943623348,1.1663538718,0.2120665889,0.6671961875,1.1807433412,0.723604178,0.9279581272,0.2694565786,0.3303379254,3.4114363323,-0.021258164,-1.10273457,-3.234015481,0.2012178978,2.1611820084,2.3910398926,2.5127854905,3.2749338018,0.9703676558,5.2294431552,1.5731041703,0.0636193021,-3.021948892,0.8684140853,3.3419253496,3.1146440706,3.4407436177,3.5443903804,1.3007055812 +050,3,6,01,097,Alabama,Mobile County,412992,413139,413328,413126,413893,414025,414298,414654,415169,414209,414275,413516,412716,189,-202,767,132,273,356,515,-960,66,-759,-800,1343,5605,5675,5391,5653,5691,5636,5534,5649,5417,5393,949,4130,4049,4376,4282,4148,4331,4433,4407,4615,5011,394,1475,1626,1015,1371,1543,1305,1101,1242,802,382,138,646,709,620,501,613,591,377,413,242,229,-315,-2324,-1515,-1468,-1550,-1767,-1364,-2433,-1578,-1809,-1425,-177,-1678,-806,-848,-1049,-1154,-773,-2056,-1165,-1567,-1196,-28,1,-53,-35,-49,-33,-17,-5,-11,6,14,6949,6949,6977,6982,7007,7065,7062,6965,6922,7388,7385,7386,13.563973312,13.723989413,13.023028851,13.64926484,13.73058995,13.583619639,13.344940425,13.636956175,13.087844637,13.054444756,9.9945066513,9.7917943844,10.571095205,10.338961975,10.007817099,10.438370592,10.689938725,10.638708774,11.150157467,12.129765005,3.5694666612,3.9321950282,2.4519336456,3.3103028649,3.7227728505,3.1452490471,2.6550017001,2.9982474013,1.9376871698,0.924679751,1.5633053987,1.714591805,1.4977328673,1.2096730382,1.4789758635,1.4244001432,0.9091150235,0.9970017526,0.5846886473,0.5543237251,-5.624027472,-3.66376105,-3.546244918,-3.742501416,-4.263214275,-3.287448046,-5.867047354,-3.809367471,-4.370668442,-3.449394359,-4.060722073,-1.949169245,-2.048512051,-2.532828377,-2.784238412,-1.863047903,-4.95793233,-2.812365719,-3.785979794,-2.895070634 +050,3,6,01,099,Alabama,Monroe County,23068,23066,23004,22799,22582,22174,21927,21720,21553,21294,21035,20689,20459,-62,-205,-217,-408,-247,-207,-167,-259,-259,-346,-230,56,259,246,229,222,217,219,230,192,197,182,39,263,291,264,244,279,251,280,277,281,286,17,-4,-45,-35,-22,-62,-32,-50,-85,-84,-104,0,-3,-1,-1,-1,-1,0,0,0,0,0,-82,-200,-173,-382,-227,-144,-136,-207,-174,-263,-125,-82,-203,-174,-383,-228,-145,-136,-207,-174,-263,-125,3,2,2,10,3,0,1,-2,0,1,-1,230,230,230,230,230,230,230,230,230,230,230,230,11.309302884,10.841541614,10.233264814,10.067798916,9.9434096272,10.121784947,10.735874157,9.0717947506,9.4430064232,8.8461164577,11.483963932,12.824750446,11.797300921,11.065508719,12.784383806,11.600767222,13.069759843,13.087953885,13.469466015,13.901040148,-0.174661048,-1.983208832,-1.564036107,-0.997709802,-2.840974179,-1.478982275,-2.333885686,-4.016159134,-4.026459592,-5.05492369,-0.130995786,-0.044071307,-0.044686746,-0.045350446,-0.045822164,0,0,0,0,0,-8.73305242,-7.624336176,-17.07033694,-10.29455114,-6.598391642,-6.28567467,-9.662286741,-8.221313993,-12.60665325,-6.075629435,-8.864048206,-7.668407483,-17.11502368,-10.33990159,-6.644213806,-6.28567467,-9.662286741,-8.221313993,-12.60665325,-6.075629435 +050,3,6,01,101,Alabama,Montgomery County,229363,229365,229498,229218,228923,228261,227647,227420,227398,227514,226631,226074,224639,133,-280,-295,-662,-614,-227,-22,116,-883,-557,-1435,709,3146,3117,3090,3209,3230,3150,3129,3143,3131,3064,458,1907,1945,2083,2075,2229,2181,2121,2141,2191,2419,251,1239,1172,1007,1134,1001,969,1008,1002,940,645,95,390,641,492,389,494,634,361,344,291,230,-188,-1915,-2141,-2195,-2161,-1719,-1626,-1246,-2228,-1796,-2308,-93,-1525,-1500,-1703,-1772,-1225,-992,-885,-1884,-1505,-2078,-25,6,33,34,24,-3,1,-7,-1,8,-2,9082,9086,8690,8601,8930,9248,8931,8989,9066,9439,8752,8755,13.716547929,13.607164607,13.517533422,14.077401581,14.19571184,13.851694524,13.756506753,13.841394268,13.832407418,13.596235298,8.3145126832,8.4908357907,9.1123048926,9.1027137054,9.7963596569,9.5906494466,9.3248804164,9.4287066906,9.6795926707,10.73410352,5.4020352462,5.1163288158,4.4052285294,4.9746878756,4.3993521833,4.2610450774,4.4316263365,4.4126875778,4.1528147469,2.8621317779,1.7003985036,2.7982651629,2.1523062924,1.7064846416,2.1711088697,2.7879283582,1.5871201463,1.5149346574,1.2856054163,1.0206051301,-8.349392653,-9.346467572,-9.602260797,-9.479982804,-7.554931472,-7.150112792,-5.477982555,-9.811844235,-7.934526899,-10.24155061,-6.648994149,-6.548202409,-7.449954504,-7.773498162,-5.383822602,-4.362184434,-3.890862409,-8.296909577,-6.648921483,-9.22094548 +050,3,6,01,103,Alabama,Morgan County,119490,119519,119642,120058,120148,119625,119496,119316,119090,118940,119216,119630,119883,123,416,90,-523,-129,-180,-226,-150,276,414,253,384,1504,1398,1393,1409,1359,1441,1436,1423,1445,1416,292,1240,1215,1233,1235,1257,1356,1311,1376,1361,1383,92,264,183,160,174,102,85,125,47,84,33,21,139,85,20,83,118,226,54,91,17,25,26,19,-160,-701,-379,-391,-536,-327,145,312,191,47,158,-75,-681,-296,-273,-310,-273,236,329,216,-16,-6,-18,-2,-7,-9,-1,-2,-7,1,4,2133,2133,2133,2121,2119,2126,2120,2107,1998,2001,2006,2007,12.549019608,11.640008992,11.619323277,11.784828601,11.381337621,12.088621931,12.065706003,11.950150322,12.099846763,11.823992852,10.346266166,10.116316828,10.284727638,10.329498455,10.52710919,11.375552629,11.015418225,11.555451049,11.396464668,11.548433697,2.2027534418,1.5236921642,1.3345956384,1.4553301467,0.8542284307,0.7130693019,1.0502877789,0.3946992727,0.7033820956,0.2755591555,1.1597830622,0.7077258686,0.1668244548,0.6942092079,0.9882250473,1.8959254381,0.4537243205,0.7642049749,0.1423511384,0.2087569359,0.1585314977,-1.33218987,-5.847197141,-3.16994325,-3.274542318,-4.496531128,-2.747552829,1.2176892457,2.6125620693,1.5949029907,1.3183145599,-0.624464002,-5.680372686,-2.475734043,-2.28631727,-2.600605689,-2.293828509,1.9818942206,2.7549132077,1.8036599266 +050,3,6,01,105,Alabama,Perry County,10591,10577,10564,10452,10166,10005,9809,9650,9538,9304,9049,8940,8687,-13,-112,-286,-161,-196,-159,-112,-234,-255,-109,-253,31,133,125,121,91,126,130,108,100,90,88,18,146,144,149,136,133,128,134,133,102,138,13,-13,-19,-28,-45,-7,2,-26,-33,-12,-50,0,2,7,0,2,5,0,-1,0,-1,0,-27,-100,-283,-133,-156,-159,-113,-207,-224,-95,-201,-27,-98,-276,-133,-154,-154,-113,-208,-224,-96,-201,1,-1,9,0,3,2,-1,0,2,-1,-2,721,721,732,749,753,773,785,763,784,708,723,723,12.65702322,12.125327384,11.997422042,9.1854244474,12.950305771,13.550135501,11.463751194,10.89740097,10.006114848,9.9846825892,13.894175866,13.968377146,14.773684993,13.727667306,13.669767203,13.341671878,14.223543148,14.49354329,11.340263494,15.657797697,-1.237152646,-1.843049762,-2.776262952,-4.542242859,-0.719461432,0.2084636231,-2.759791954,-3.59614232,-1.334148646,-5.673115108,0.1903311762,0.6790183335,0,0.2018774604,0.5139010227,0,-0.106145844,0,-0.111179054,0,-9.516558812,-27.4517412,-13.18724902,-15.74644191,-16.34205252,-11.77819471,-21.97218979,-24.41017817,-10.56201012,-22.80592273,-9.326227636,-26.77272286,-13.18724902,-15.54456445,-15.8281515,-11.77819471,-22.07833563,-24.41017817,-10.67318917,-22.80592273 +050,3,6,01,107,Alabama,Pickens County,19746,19746,19749,19357,19314,19309,20283,20788,20337,20224,19949,19940,19793,3,-392,-43,-5,974,505,-451,-113,-275,-9,-147,53,220,224,199,229,236,228,216,195,239,207,31,267,240,261,244,261,262,219,248,221,283,22,-47,-16,-62,-15,-25,-34,-3,-53,18,-76,-1,-1,0,5,6,11,28,12,18,3,3,-18,-345,-24,52,934,508,-447,-122,-241,-30,-75,-19,-346,-24,57,940,519,-419,-110,-223,-27,-72,0,1,-3,0,49,11,2,0,1,0,1,334,334,334,334,503,1661,2196,1840,1787,1779,1874,1875,11.251470363,11.584908588,10.304740699,11.567993534,11.492293833,11.088145897,10.650624985,9.7080128444,11.983253529,10.4195505,13.655193576,12.412402058,13.515262926,12.325722368,12.70969784,12.741641337,10.798550332,12.346600951,11.080749079,14.245085949,-2.403723214,-0.827493471,-3.210522228,-0.757728834,-1.217404008,-1.653495441,-0.147925347,-2.638588106,0.9025044498,-3.825535449,-0.051143047,0,0.2589130829,0.3030915336,0.5356577634,1.3617021277,0.591701388,0.8961242626,0.1504174083,0.1510079783,-17.64435125,-1.241240206,2.6926960619,47.181248737,24.737649436,-21.73860182,-6.015630778,-11.99810818,-1.504174083,-3.775199456,-17.6954943,-1.241240206,2.9516091448,47.484340271,25.2733072,-20.3768997,-5.42392939,-11.10198392,-1.353756675,-3.624191478 +050,3,6,01,109,Alabama,Pike County,32899,32902,32972,33031,33225,33728,33217,33518,33540,33441,33390,33034,32966,70,59,194,503,-511,301,22,-99,-51,-356,-68,93,388,413,352,393,381,395,346,374,345,353,79,326,314,347,319,314,296,322,329,330,376,14,62,99,5,74,67,99,24,45,15,-23,30,100,131,115,125,106,173,107,103,95,76,27,-103,-30,371,-734,127,-250,-232,-200,-466,-123,57,-3,101,486,-609,233,-77,-125,-97,-371,-47,-1,0,-6,12,24,1,0,2,1,0,2,1963,1963,1898,1839,2218,1943,2308,2341,2239,2205,1912,1912,11.757041347,12.46679546,10.514838767,11.740981403,11.418296246,11.780846431,10.331287977,11.192410708,10.387811634,10.696969697,9.8783388634,9.4783868631,10.365480262,9.5302113675,9.4103543868,8.8281785917,9.6146668458,9.8457302749,9.9361676502,11.393939394,1.8787024832,2.988408597,0.1493585052,2.2107700351,2.0079418596,2.9526678398,0.7166211314,1.3466804327,0.4516439841,-0.696969697,3.0301652955,3.9543588505,3.4352456201,3.7344088431,3.1767438376,5.1597124877,3.1949358773,3.0824018794,2.8604118993,2.303030303,-3.121070254,-0.905578363,11.082401087,-21.92844873,3.8060987488,-7.456231919,-6.927337603,-5.985246368,-14.03107311,-3.727272727,-0.090904959,3.0487804878,14.517646707,-18.19403988,6.9828425863,-2.296519431,-3.732401726,-2.902844488,-11.17066121,-1.424242424 +050,3,6,01,111,Alabama,Randolph County,22913,22916,22937,22751,22541,22558,22362,22603,22515,22702,22742,22781,22920,21,-186,-210,17,-196,241,-88,187,40,39,139,42,223,240,269,255,274,241,260,239,268,243,49,300,255,281,293,302,309,314,333,271,306,-7,-77,-15,-12,-38,-28,-68,-54,-94,-3,-63,0,-4,-7,-4,-8,-4,-2,-2,-1,-3,0,30,-105,-188,34,-152,272,-17,244,136,44,203,30,-109,-195,30,-160,268,-19,242,135,41,203,-2,0,0,-1,2,1,-1,-1,-1,1,-1,407,407,407,398,398,397,397,387,402,390,390,390,9.7618630713,10.597898084,11.929311071,11.353517364,12.187256755,10.683097655,11.50009952,10.518440278,11.774267952,10.634340605,13.132551217,11.260266714,12.461473647,13.045414069,13.432669854,13.697415666,13.888581728,14.655400053,11.906069459,13.391391873,-3.370688146,-0.66236863,-0.532162576,-1.691896705,-1.245413099,-3.014318011,-2.388482208,-4.136959775,-0.131801507,-2.757051268,-0.175100683,-0.309105361,-0.177387525,-0.35618878,-0.177916157,-0.088656412,-0.088462304,-0.04401021,-0.131801507,0,-4.596392926,-8.301686832,1.5077939644,-6.767586821,12.098298677,-0.753579503,10.792401088,5.9853886102,1.9330887683,8.8838318636,-4.771493609,-8.610792193,1.3304064392,-7.123775601,11.92038252,-0.842235915,10.703938784,5.9413783998,1.8012872614,8.8838318636 +050,3,6,01,113,Alabama,Russell County,52947,52966,53327,54884,57549,59219,59310,58946,58290,57134,57933,58098,58237,361,1557,2665,1670,91,-364,-656,-1156,799,165,139,189,800,902,867,919,938,848,811,791,782,747,93,572,577,522,459,615,624,693,638,609,701,96,228,325,345,460,323,224,118,153,173,46,10,2,123,65,40,61,-2,-7,-16,-29,-11,232,1318,2127,1213,-413,-755,-882,-1270,658,21,101,242,1320,2250,1278,-373,-694,-884,-1277,642,-8,90,23,9,90,47,4,7,4,3,4,0,3,574,574,574,574,574,574,574,574,574,574,574,574,14.785927494,16.045111311,14.849958893,15.506753621,15.863888513,14.466546112,14.052536734,13.748511737,13.479156432,12.842222891,10.571938158,10.263890495,8.9408057002,7.7449400569,10.401163577,10.645194309,12.007901303,11.089191515,10.497194715,12.051403275,4.2139893356,5.781220816,5.9091531927,7.7618135646,5.4627249357,3.8213518032,2.0446354311,2.6593202221,2.9819617171,0.7908196158,0.0369648187,2.1879697242,1.1133187175,0.67494031,1.0316601272,-0.034119213,-0.121291932,-0.278098847,-0.499866415,-0.189109039,24.359815546,37.835866694,20.776240066,-6.9687587,-12.76890813,-15.04657273,-22.00582201,11.436815073,0.3619722316,1.7363648085,24.396780364,40.023836418,21.889558783,-6.29381839,-11.737248,-15.08069194,-22.12711395,11.158716226,-0.137894183,1.54725577 +050,3,6,01,115,Alabama,St. Clair County,83593,83366,83587,83992,84779,85831,86014,86569,87342,87985,88842,89735,90739,221,405,787,1052,183,555,773,643,857,893,1004,277,1103,1059,1045,994,1028,1055,1024,1008,956,946,192,829,801,893,911,913,925,976,956,959,1046,85,274,258,152,83,115,130,48,52,-3,-100,12,46,47,41,23,43,47,50,50,47,39,122,89,489,848,96,404,598,547,756,850,1066,134,135,536,889,119,447,645,597,806,897,1105,2,-4,-7,11,-19,-7,-2,-2,-1,-1,-1,1967,1967,1931,1925,1893,1885,1897,1633,1561,1581,1518,1515,13.163940589,12.549549389,12.250161186,11.568564695,11.913108475,12.132642559,11.681030303,11.400973833,10.706865946,10.483504549,9.8938411137,9.4921520877,10.468319559,10.602577905,10.580416379,10.637624992,11.133482008,10.812828358,10.740464897,11.591697419,3.2700994755,3.0573973017,1.7818416271,0.9659867904,1.332692096,1.4950175665,0.5475482955,0.5881454755,-0.033598952,-1.10819287,0.5489948025,0.5569677255,0.4806283336,0.2676830865,0.4983109576,0.5405063509,0.5703628078,0.5655244957,0.5263835768,0.4321952193,1.062185596,5.7948344206,9.9408006565,1.1172859263,4.6818052763,6.8770808057,6.2397691171,8.5507303749,9.5197029853,11.813335993,1.6111803985,6.3518021461,10.42142899,1.3849690128,5.1801162339,7.4175871566,6.8101319249,9.1162548706,10.046086562,12.245531212 +050,3,6,01,117,Alabama,Shelby County,195085,195257,196036,197968,200949,204088,206346,209047,211538,213854,215877,218176,221428,779,1932,2981,3139,2258,2701,2491,2316,2023,2299,3252,631,2477,2381,2403,2353,2403,2484,2229,2299,2241,2223,317,1259,1285,1349,1280,1377,1390,1486,1537,1661,1868,314,1218,1096,1054,1073,1026,1094,743,762,580,355,55,339,226,253,164,181,368,204,235,135,117,393,381,1647,1825,1044,1502,1041,1379,1038,1588,2789,448,720,1873,2078,1208,1683,1409,1583,1273,1723,2906,17,-6,12,7,-23,-8,-12,-10,-12,-4,-9,2574,2574,2619,2669,2652,2633,2700,2552,2512,2410,2540,2541,12.573476411,11.937320295,11.86558265,11.465911693,11.569766462,11.812118834,10.47974574,10.6997168,10.32592794,10.113647738,6.390798063,6.4424429142,6.6611198483,6.2373000288,6.6298661749,6.6098410547,6.9864971603,7.1533121883,7.6534432431,8.4985577929,6.1826783484,5.4948773805,5.2044628022,5.2286116647,4.9399002872,5.2022777798,3.4932485801,3.5464046113,2.6724846966,1.6150899446,1.7207947127,1.133067781,1.2492685853,0.7991540662,0.8714638908,1.749943531,0.9591153571,1.0937074589,0.6220438518,0.5322972493,1.9339905179,8.2573567935,9.0115224041,5.0872978359,7.2317058785,4.950247869,6.4834317524,4.8309291161,7.3170787899,12.688692551,3.6547852306,9.3904245745,10.260790989,5.8864519021,8.1031697694,6.7001914001,7.4425471095,5.924636575,7.9391226417,13.2209898 +050,3,6,01,119,Alabama,Sumter County,13763,13763,13730,13491,13444,13398,13276,13212,12973,12756,12661,12358,12225,-33,-239,-47,-46,-122,-64,-239,-217,-95,-303,-133,27,129,127,138,171,165,149,136,139,134,137,57,160,156,153,163,157,144,169,159,142,160,-30,-31,-29,-15,8,8,5,-33,-20,-8,-23,0,21,42,44,31,50,40,34,33,29,23,-2,-229,-60,-74,-165,-123,-286,-219,-108,-323,-133,-2,-208,-18,-30,-134,-73,-246,-185,-75,-294,-110,-1,0,0,-1,4,1,2,1,0,-1,0,718,718,805,872,854,838,901,896,941,913,785,784,9.4779765622,9.4301095229,10.282393264,12.821474095,12.458471761,11.38056139,10.5717284,10.937561475,10.711858987,11.145913843,11.755629845,11.583441619,11.400044706,12.221639049,11.854424645,10.998663357,13.136927203,12.511311327,11.351372957,13.017125656,-2.277653282,-2.153332096,-1.117651442,0.5998350454,0.6040471157,0.3818980332,-2.565198803,-1.573749852,-0.639513969,-1.871211813,1.5429264171,3.1186188973,3.2784442292,2.3243608008,3.775294473,3.0551842658,2.6429321,2.5966872566,2.318238139,1.871211813,-16.82524522,-4.455169853,-5.513747113,-12.37159781,-9.287224404,-21.8445675,-17.02359206,-8.498249203,-25.82037651,-10.8204857,-15.2823188,-1.336550956,-2.235302884,-10.04723701,-5.511929931,-18.78938323,-14.38065996,-5.901561947,-23.50213837,-8.949273888 +050,3,6,01,121,Alabama,Talladega County,82291,82348,82175,81875,82170,81604,81550,81168,80598,80192,80219,80226,79985,-173,-300,295,-566,-54,-382,-570,-406,27,7,-241,202,855,895,877,858,867,876,840,852,883,845,193,927,949,1015,973,919,1015,1049,1043,1082,1155,9,-72,-54,-138,-115,-52,-139,-209,-191,-199,-310,-1,34,41,43,33,50,44,52,71,18,23,-185,-260,318,-470,48,-375,-474,-245,149,186,42,-186,-226,359,-427,81,-325,-430,-193,220,204,65,4,-2,-10,-1,-20,-5,-1,-4,-2,2,4,3143,3143,3118,3490,3214,3283,3173,3043,2945,3064,3256,3251,10.423651326,10.911640099,10.709880689,10.517670422,10.656473162,10.830458811,10.448410971,10.622712906,11.006887095,10.548589048,11.30143249,11.569996038,12.395129874,11.927381492,11.295615728,12.548990517,13.048075129,13.004095729,13.487487924,14.418485622,-0.877781164,-0.658355939,-1.685249185,-1.409711071,-0.639142566,-1.718531706,-2.599664158,-2.381382823,-2.480600829,-3.869896574,0.414507772,0.4998628425,0.5251138764,0.4045257855,0.6145601593,0.543995648,0.6468063934,0.8852260755,0.2243759544,0.2871213587,-3.169765315,3.8769849736,-5.739616789,0.5884011425,-4.609201195,-5.860316754,-3.0474532,1.8577279613,2.3185515286,0.5243085681,-2.755257543,4.3768478161,-5.214502913,0.9929269279,-3.994641035,-5.316321106,-2.400646806,2.7429540368,2.5429274829,0.8114299268 +050,3,6,01,123,Alabama,Tallapoosa County,41616,41621,41480,41414,41060,41039,40898,40628,40607,40624,40550,40337,40133,-141,-66,-354,-21,-141,-270,-21,17,-74,-213,-204,128,467,498,445,454,476,467,410,432,367,375,162,506,528,526,514,480,535,603,545,551,585,-34,-39,-30,-81,-60,-4,-68,-193,-113,-184,-210,2,13,12,3,-6,-2,1,-5,-2,-7,-8,-112,-40,-340,60,-67,-263,48,219,43,-22,13,-110,-27,-328,63,-73,-265,49,214,41,-29,5,3,0,4,-3,-8,-1,-2,-4,-2,0,1,576,576,576,576,576,576,576,576,576,576,576,576,11.267401742,12.07653321,10.840570531,11.081684709,11.677256335,11.497507232,10.094668292,10.643802203,9.0743877261,9.320243569,12.208362487,12.804035211,12.813797976,12.546224538,11.77538454,13.171662461,14.846548731,13.427944908,13.623944515,14.539579968,-0.940960745,-0.727502001,-1.973227445,-1.464539829,-0.098128204,-1.674155229,-4.75188044,-2.784142706,-4.549556789,-5.219336399,0.3136535817,0.2910008003,0.073082498,-0.146453983,-0.049064102,0.0246199298,-0.123105711,-0.049276862,-0.173080965,-0.198831863,-0.965087944,-8.245022674,1.4616499592,-1.635402809,-6.451929446,1.181756632,5.3920301363,1.0594525341,-0.543968747,0.3231017771,-0.651434362,-7.954021874,1.5347324572,-1.781856792,-6.500993548,1.2063765618,5.2689244254,1.010175672,-0.717049711,0.1242699143 +050,3,6,01,125,Alabama,Tuscaloosa County,194656,194678,195008,196788,198884,201192,203228,204953,206737,207849,208607,210321,210758,330,1780,2096,2308,2036,1725,1784,1112,758,1714,437,559,2407,2450,2400,2470,2485,2624,2569,2461,2377,2362,323,1725,1585,1658,1611,1774,1716,1771,1814,1875,2063,236,682,865,742,859,711,908,798,647,502,299,51,273,331,417,320,403,421,224,246,165,144,61,822,891,1139,860,623,461,99,-133,1037,-23,112,1095,1222,1556,1180,1026,882,323,113,1202,121,-18,3,9,10,-3,-12,-6,-9,-2,10,17,10423,10427,10133,10397,10474,10918,11081,10750,10410,9945,10663,10665,12.287006503,12.383994824,11.997720433,12.215023985,12.175970954,12.74745561,12.393086115,11.818775573,11.348012069,11.218797423,8.8056029158,8.0116864474,8.2884251992,7.9669650363,8.6922223229,8.3363695985,8.543462635,8.7116045873,8.9514188596,9.7986363604,3.4814035876,4.3723083766,3.7092952339,4.2480589486,3.4837486311,4.4110860113,3.8496234798,3.1071709857,2.3965932093,1.4201610624,1.3935823745,1.6731029742,2.0846039253,1.5825132288,1.974614203,2.0452282057,1.0805960645,1.1813973145,0.7877248596,0.6839571672,4.1960612155,4.5037303625,5.6939181556,4.2530043025,3.0525673659,2.2395491754,0.4775848678,-0.638722938,4.9507313906,-0.109243159,5.58964359,6.1768333367,7.7785220808,5.8355175313,5.027181569,4.284777381,1.5581809323,0.5426743762,5.7384562502,0.5747140085 +050,3,6,01,127,Alabama,Walker County,67023,67019,66995,66586,66110,65790,65354,64950,64559,63929,63701,63680,63143,-24,-409,-476,-320,-436,-404,-391,-630,-228,-21,-537,217,814,826,754,806,804,797,774,781,757,767,240,909,1024,1030,961,1058,984,1077,1088,912,988,-23,-95,-198,-276,-155,-254,-187,-303,-307,-155,-221,3,27,42,33,18,7,18,5,7,-1,4,5,-340,-314,-67,-294,-153,-220,-329,77,134,-320,8,-313,-272,-34,-276,-146,-202,-324,84,133,-316,-9,-1,-6,-10,-5,-4,-2,-3,-5,1,0,866,866,850,851,851,851,851,851,851,852,852,852,12.187361975,12.449508651,11.432903715,12.291831879,12.340373281,12.308024925,12.047817695,12.23850192,11.885603033,12.095597802,13.609719945,15.433773437,15.617892343,14.655645702,16.238948919,15.195855114,16.764211444,17.049283084,14.319246983,15.58077005,-1.42235797,-2.984264786,-4.184988628,-2.363813823,-3.898575639,-2.887830189,-4.716393749,-4.810781164,-2.43364395,-3.485172248,0.4042491073,0.6330258636,0.5003790751,0.2745074117,0.1074410609,0.2779729594,0.0778282797,0.1096920787,-0.015700929,0.0630800407,-5.090544314,-4.732621933,-1.015921152,-4.483621058,-2.348354617,-3.397447282,-5.121100803,1.2066128653,2.1039244471,-5.046403255,-4.686295207,-4.099596069,-0.515542077,-4.209113646,-2.240913556,-3.119474322,-5.043272524,1.316304944,2.0882235184,-4.983323214 +050,3,6,01,129,Alabama,Washington County,17581,17580,17627,17356,17147,16898,16868,16831,16607,16484,16336,16279,15976,47,-271,-209,-249,-30,-37,-224,-123,-148,-57,-303,42,169,165,160,166,177,183,160,179,173,181,25,200,183,231,212,222,233,186,192,181,231,17,-31,-18,-71,-46,-45,-50,-26,-13,-8,-50,2,20,26,17,23,17,4,3,2,2,3,27,-259,-224,-196,-5,-9,-177,-101,-136,-52,-253,29,-239,-198,-179,18,8,-173,-98,-134,-50,-250,1,-1,7,1,-2,0,-1,1,-1,1,-3,147,147,147,147,147,147,147,147,147,147,147,147,9.6618357488,9.5643857056,9.3993244236,9.8323757626,10.504762753,10.94563072,9.6703031036,10.907982937,10.608615668,11.223066191,11.434125146,10.607773237,13.570274637,12.55701001,13.175465147,13.936240206,11.241727358,11.700182815,11.09918749,14.323360719,-1.772289398,-1.043387532,-4.170950213,-2.724634247,-2.670702395,-2.990609486,-1.571424254,-0.792199878,-0.490571823,-3.100294528,1.1434125146,1.5071153233,0.99867822,1.3623171237,1.0089320158,0.2392487589,0.1813181832,0.1218769043,0.1226429557,0.1860176717,-14.80719206,-12.98437817,-11.51417242,-0.296155896,-0.534140479,-10.58675758,-6.104378834,-8.287629494,-3.188716848,-15.68749031,-13.66377955,-11.47726285,-10.5154942,1.0661612273,0.4747915368,-10.34750882,-5.923060651,-8.16575259,-3.066073892,-15.50147264 +050,3,6,01,131,Alabama,Wilcox County,11670,11664,11560,11438,11304,11148,10950,10900,10860,10704,10592,10396,10206,-104,-122,-134,-156,-198,-50,-40,-156,-112,-196,-190,21,142,137,141,142,122,141,135,150,124,123,64,142,144,151,176,150,133,134,178,122,143,-43,0,-7,-10,-34,-28,8,1,-28,2,-20,0,0,0,0,0,0,0,7,7,6,5,-67,-122,-131,-149,-169,-22,-47,-165,-92,-204,-174,-67,-122,-131,-149,-169,-22,-47,-158,-85,-198,-169,6,0,4,3,5,0,-1,1,1,0,-1,108,108,108,108,108,108,108,108,108,108,108,108,12.348899904,12.048192771,12.560128274,12.851841796,11.167048055,12.959558824,12.520868114,14.087152517,11.816275967,11.940588292,12.348899904,12.663793862,13.450917513,15.929043352,13.729977117,12.224264706,12.428120942,16.71675432,11.625690871,13.882147364,0,-0.61560109,-0.890789239,-3.077201557,-2.562929062,0.7352941176,0.0927471712,-2.629601803,0.1905850962,-1.941559072,0,0,0,0,0,0,0.6492301985,0.6574004508,0.5717552887,0.485389768,-10.60961823,-11.52053469,-13.27275967,-15.29550186,-2.013729977,-4.319852941,-15.30328325,-8.64012021,-19.43967982,-16.89156393,-10.60961823,-11.52053469,-13.27275967,-15.29550186,-2.013729977,-4.319852941,-14.65405305,-7.98271976,-18.86792453,-16.40617416 +050,3,6,01,133,Alabama,Winston County,24484,24488,24412,24362,24194,24190,24141,23929,23911,23753,23690,23700,23508,-76,-50,-168,-4,-49,-212,-18,-158,-63,10,-192,59,251,228,249,248,232,246,262,223,249,241,61,315,298,319,300,284,314,342,335,305,362,-2,-64,-70,-70,-52,-52,-68,-80,-112,-56,-121,0,-2,0,1,5,2,1,-1,0,-1,-1,-76,18,-95,67,4,-162,50,-74,50,67,-69,-76,16,-95,68,9,-160,51,-75,50,66,-70,2,-2,-3,-2,-6,0,-1,-3,-1,0,-1,301,301,301,301,301,301,301,301,301,301,301,301,10.292368885,9.391218387,10.29265873,10.2625644,9.652589973,10.284280936,10.993622021,9.4007545897,10.508546107,10.210133876,12.916717923,12.27448719,13.186177249,12.414392419,11.816101519,13.127090301,14.350453172,14.12220981,12.871913906,15.336383664,-2.624349038,-2.883268803,-2.893518519,-2.151828019,-2.163511546,-2.842809365,-3.356831151,-4.72145522,-2.363367799,-5.126249788,-0.082010907,0,0.0413359788,0.2069065403,0.0832119825,0.0418060201,-0.041960389,0,-0.042202996,-0.042365701,0.7380981671,-3.913007661,2.769510582,0.1655252323,-6.740170585,2.0903010033,-3.105068815,2.1077925089,2.8276007597,-2.92323335,0.6560872596,-3.913007661,2.8108465608,0.3724317726,-6.656958602,2.1321070234,-3.147029204,2.1077925089,2.7853977632,-2.965599051 +040,4,9,02,000,Alaska,Alaska,710231,710246,713982,722349,730810,737626,737075,738430,742575,740983,736624,733603,731158,3736,8367,8461,6816,-551,1355,4145,-1592,-4359,-3021,-2445,2902,11712,11126,11349,11447,11347,11284,10757,10374,9860,9733,899,3922,3923,4038,4007,4337,4426,4429,4435,4748,5249,2003,7790,7203,7311,7440,7010,6858,6328,5939,5112,4484,480,1442,2482,2995,1343,2417,2442,2792,742,1232,1078,1163,-888,-1324,-3502,-9585,-8197,-5194,-10765,-11078,-9355,-7980,1643,554,1158,-507,-8242,-5780,-2752,-7973,-10336,-8123,-6902,90,23,100,12,251,125,39,53,38,-10,-27,26366,26344,25556,26842,28246,28231,27916,27687,26888,26878,27008,27015,16.308218649,15.312846013,15.457262012,15.524502933,15.380496847,15.238301019,14.501623799,14.041622705,13.412894743,13.289540068,5.4611367436,5.3992715181,5.4997289633,5.4343219405,5.8786652705,5.9770223598,5.9707810547,6.0029493634,6.458866556,7.1670395375,10.847081905,9.9135744953,9.9575330488,10.090180993,9.5018315763,9.2612786587,8.5308427443,8.0386733414,6.9540281875,6.1225005308,2.0078937237,3.4160060943,4.0791699468,1.8213861657,3.276166465,3.2977606423,3.7639242955,1.0043265902,1.6759316759,1.4719124827,-1.236483791,-1.822236933,-4.769700552,-12.99924527,-11.11077224,-7.014155928,-14.51240868,-14.99451478,-12.725926,-10.89597552,0.7714099327,1.5937691608,-0.690530605,-11.1778591,-7.834605779,-3.716395286,-10.74848439,-13.99018819,-11.04999432,-9.424063038 +050,4,9,02,013,Alaska,Aleutians East Borough,3141,3141,3167,3260,3297,3346,3347,3373,3354,3445,3391,3355,3401,26,93,37,49,1,26,-19,91,-54,-36,46,2,20,17,15,17,9,10,15,14,6,4,1,6,4,7,9,7,10,11,3,9,7,1,14,13,8,8,2,0,4,11,-3,-3,15,84,54,87,73,77,87,115,51,67,49,9,-4,-30,-48,-82,-54,-107,-28,-117,-99,-2,24,80,24,39,-9,23,-20,87,-66,-32,47,1,-1,0,2,2,1,1,0,1,-1,2,1726,1726,1726,1726,1726,1726,1727,1727,1730,1731,1746,1745,6.2237435818,5.1852981546,4.5160319133,5.0799342597,2.6785714286,2.9730935038,4.4124135902,4.0959625512,1.7788319004,1.1841326229,1.8671230745,1.220070154,2.1074815595,2.689376961,2.0833333333,2.9730935038,3.2357699662,0.877706261,2.6682478506,2.07223209,4.3566205072,3.9652280006,2.4085503538,2.3905572987,0.5952380952,0,1.1766436241,3.2182562902,-0.88941595,-0.888099467,26.139723043,16.470947079,26.192985097,21.81383535,22.916666667,25.865913483,33.828504192,14.921006437,19.863622888,14.50562463,-1.244748716,-9.150526155,-14.45130212,-24.50321231,-16.07142857,-31.81210049,-8.236505368,-34.23054418,-29.35072636,-0.592066311,24.894974327,7.3204209242,11.741682975,-2.689376961,6.8452380952,-5.946187008,25.591998823,-19.30953774,-9.487103469,13.913558319 +050,4,9,02,016,Alaska,Aleutians West Census Area,5561,5561,5561,5585,5681,5779,5825,5782,5718,5760,5678,5702,5680,0,24,96,98,46,-43,-64,42,-82,24,-22,4,30,33,37,37,29,34,35,35,33,33,0,5,16,16,15,17,16,19,11,4,7,4,25,17,21,22,12,18,16,24,29,26,12,67,83,162,77,104,136,162,62,80,68,-17,-70,-2,-87,-54,-160,-221,-137,-169,-86,-115,-5,-3,81,75,23,-56,-85,25,-107,-6,-47,1,2,-2,2,1,1,3,1,1,1,-1,2543,2549,2535,2528,2531,2527,2527,2521,2524,2525,2541,2542,5.3830970752,5.8583348127,6.4572425829,6.3771113409,4.9969845783,5.9130434783,6.0986234536,6.1199510404,5.7996485062,5.7986294149,0.8971828459,2.8404047577,2.7923211169,2.5853154085,2.9292668217,2.7826086957,3.3106813034,1.9234131841,0.7029876977,1.2300123001,4.4859142293,3.017930055,3.664921466,3.7917959324,2.0677177565,3.1304347826,2.7879421502,4.1965378563,5.0966608084,4.5686171147,12.022250135,14.73459968,28.272251309,13.271285764,17.920220557,23.652173913,28.227914271,10.841056129,14.059753954,11.948690915,-12.56055984,-0.355050595,-15.18324607,-9.307135471,-27.56957009,-38.43478261,-23.87175466,-29.55062074,-15.1142355,-20.20734493,-0.538309708,14.379549086,13.089005236,3.964150293,-9.64934953,-14.7826087,4.3561596097,-18.70956461,-1.054481547,-8.258654015 +050,4,9,02,020,Alaska,Anchorage Municipality,291826,292252,293760,296693,298806,301801,300647,298337,298072,295118,291377,288790,287095,1508,2933,2113,2995,-1154,-2310,-265,-2954,-3741,-2587,-1695,1160,4784,4588,4701,4792,4644,4566,4287,4086,3930,3861,313,1498,1504,1587,1619,1686,1705,1746,1679,1943,2047,847,3286,3084,3114,3173,2958,2861,2541,2407,1987,1814,282,780,1303,1525,615,1135,1198,1350,313,582,490,361,-1132,-2283,-1609,-5037,-6477,-4344,-6881,-6485,-5148,-3994,643,-352,-980,-84,-4422,-5342,-3146,-5531,-6172,-4566,-3504,18,-1,9,-35,95,74,20,36,24,-8,-5,8862,8845,9150,9040,9323,8922,8607,8428,8107,8129,8022,8022,16.204507387,15.40892596,15.654163205,15.908426951,15.506257262,15.311640166,14.454053507,13.933622623,13.547823299,13.40892713,5.0740702478,5.0512259466,5.284653692,5.3747377367,5.6295326753,5.7175528874,5.8868153543,5.7255390072,6.6980714174,7.1090582321,11.130437139,10.357700013,10.369509513,10.533689215,9.876724587,9.594087279,8.567238153,8.2080836154,6.8497518818,6.2998688974,2.6420392478,4.3761618407,5.0781958918,2.0416699865,3.7897506444,4.0173773367,4.5516613564,1.067357778,2.0063188703,1.7017286437,-3.834344139,-7.667519173,-5.357912911,-16.72177516,-21.62662108,-14.5671846,-23.19998651,-22.11442553,-17.74661434,-13.8708249,-1.192304891,-3.291357332,-0.27971702,-14.68010517,-17.83687043,-10.54980726,-18.64832516,-21.04706775,-15.74029547,-12.16909626 +050,4,9,02,050,Alaska,Bethel Census Area,17013,17013,17081,17418,17655,17855,17960,17970,18018,18102,18267,18493,18437,68,337,237,200,105,10,48,84,165,226,-56,113,465,421,444,441,413,410,435,414,422,426,32,106,123,92,93,119,111,132,126,146,165,81,359,298,352,348,294,299,303,288,276,261,0,1,7,8,7,4,9,18,8,11,8,-12,-24,-65,-161,-254,-291,-260,-240,-131,-62,-325,-12,-23,-58,-153,-247,-287,-251,-222,-123,-51,-317,-1,1,-3,1,4,3,0,3,0,1,0,338,338,352,344,369,379,341,356,303,336,360,360,26.95730311,24.007070966,25.00704027,24.62655312,22.989145561,22.785372902,24.086378738,22.76664192,22.959738847,23.070674249,6.1451056552,7.0139423488,5.1816389749,5.1933547396,6.6239910938,6.1687229076,7.3089700997,6.9289779757,7.9434167573,8.9358245329,20.812197455,16.993128617,19.825401295,19.433198381,16.365154467,16.616649994,16.777408638,15.837663945,15.016322089,14.134849716,0.0579726949,0.3991674507,0.4505773022,0.3908976686,0.2226551628,0.5001667222,0.9966777409,0.4399351096,0.598476605,0.4332520986,-1.391344677,-3.7065549,-9.067868206,-14.18400112,-16.19816309,-14.44926086,-13.28903654,-7.203937419,-3.373231774,-17.6008665,-1.333371982,-3.307387449,-8.617290904,-13.79310345,-15.97550793,-13.94909414,-12.2923588,-6.76400231,-2.774755169,-17.16761441 +050,4,9,02,060,Alaska,Bristol Bay Borough,997,997,1002,1029,980,952,949,906,906,869,881,840,788,5,27,-49,-28,-3,-43,0,-37,12,-41,-52,3,15,9,15,5,11,13,7,9,11,8,3,8,10,8,8,6,9,5,11,4,6,0,7,-1,7,-3,5,4,2,-2,7,2,0,0,0,0,0,1,1,1,0,0,0,5,21,-52,-34,0,-50,-4,-40,14,-49,-55,5,21,-52,-34,0,-49,-3,-39,14,-49,-55,0,-1,4,-1,0,1,-1,0,0,1,1,16,16,16,16,16,16,16,16,16,16,15,15,14.771048744,8.9596814335,15.527950311,5.2603892688,11.859838275,14.348785872,7.8873239437,10.285714286,12.783265543,9.828009828,7.8778926637,9.9552015928,8.281573499,8.4166228301,6.4690026954,9.9337748344,5.6338028169,12.571428571,4.6484601976,7.371007371,6.8931560807,-0.995520159,7.2463768116,-3.156233561,5.3908355795,4.4150110375,2.2535211268,-2.285714286,8.1348053457,2.457002457,0,0,0,0,1.0781671159,1.1037527594,1.1267605634,0,0,0,20.679468242,-51.76704828,-35.19668737,0,-53.9083558,-4.415011038,-45.07042254,16,-56.94363742,-67.56756757,20.679468242,-51.76704828,-35.19668737,0,-52.83018868,-3.311258278,-43.94366197,16,-56.94363742,-67.56756757 +050,4,9,02,063,Alaska,Chugach Census Area,X,6684,6710,6775,6771,6809,6622,6526,6542,6509,6487,6509,6427,26,65,-4,38,-187,-96,16,-33,-22,22,-82,15,93,76,96,84,91,85,85,83,74,73,3,36,28,27,32,41,31,22,23,39,34,12,57,48,69,52,50,54,63,60,35,39,0,11,15,17,1,2,9,13,5,5,5,14,-5,-70,-48,-247,-149,-47,-110,-88,-18,-126,14,6,-55,-31,-246,-147,-38,-97,-83,-13,-121,0,2,3,0,7,1,0,1,1,0,0,183,183,183,183,183,183,183,183,183,183,183,183,13.793103448,11.221024657,14.138438881,12.508376145,13.842409492,13.008876645,13.025821776,12.773160973,11.388119421,11.286332715,5.3392658509,4.1340617156,3.9764359352,4.7650956742,6.2366899909,4.7444138353,3.3713891656,3.539550631,6.0018467221,5.2566481138,8.4538375973,7.0869629411,10.162002946,7.7432804706,7.6057195011,8.2644628099,9.6544326105,9.2336103416,5.3862726993,6.0296846011,1.6314423433,2.2146759191,2.5036818851,0.1489092398,0.30422878,1.3774104683,1.9921845069,0.7694675285,0.7694675285,0.7730364873,-0.741564702,-10.33515429,-7.06921944,-36.78058224,-22.66504411,-7.193143557,-16.85694583,-13.5426285,-2.770083102,-19.48051948,0.8898776418,-8.12047837,-4.565537555,-36.631673,-22.36081533,-5.815733088,-14.86476132,-12.77316097,-2.000615574,-18.70748299 +050,4,9,02,066,Alaska,Copper River Census Area,X,2952,2964,2995,2993,3014,2937,2891,2898,2887,2880,2886,2919,12,31,-2,21,-77,-46,7,-11,-7,6,33,7,39,34,42,38,39,36,37,34,32,32,1,11,12,5,8,15,7,6,5,18,2,6,28,22,37,30,24,29,31,29,14,30,0,7,6,7,1,-1,3,7,3,3,3,6,-4,-30,-22,-112,-71,-25,-50,-39,-11,-1,6,3,-24,-15,-111,-72,-22,-43,-36,-8,2,0,0,0,-1,4,2,0,1,0,0,1,18,18,18,18,18,18,18,18,18,18,18,18,13.089444538,11.356045424,13.9836857,12.770962863,13.383665065,12.43738124,12.791702679,11.791225941,11.099549081,11.024978467,3.6918946132,4.0080160321,1.6647244881,2.6886237607,5.1475634866,2.4183796856,2.0743301642,1.7340038148,6.243496358,0.6890611542,9.3975499245,7.3480293921,12.318961212,10.082339103,8.2361015786,10.019001555,10.717372515,10.057222126,4.8560527229,10.335917313,2.3493874811,2.004008016,2.3306142833,0.3360779701,-0.343170899,1.0364484367,2.4200518583,1.0404022889,1.0405827263,1.0335917313,-1.342507132,-10.02004008,-7.324787748,-37.64073265,-24.36513384,-8.637070306,-17.2860847,-13.52522976,-3.815469997,-0.344530577,1.0068803491,-8.016032064,-4.994173464,-37.30465468,-24.70830474,-7.600621869,-14.86603284,-12.48482747,-2.77488727,0.6890611542 +050,4,9,02,068,Alaska,Denali Borough,1826,1827,1839,1878,1915,1948,1922,1940,2068,2103,2047,2125,2081,12,39,37,33,-26,18,128,35,-56,78,-44,9,19,21,23,17,16,22,21,8,21,14,3,5,7,10,6,7,8,9,13,8,0,6,14,14,13,11,9,14,12,-5,13,14,4,19,17,28,14,23,38,43,9,18,14,2,5,5,-5,-53,-14,74,-20,-60,47,-72,6,24,22,23,-39,9,112,23,-51,65,-58,0,1,1,-3,2,0,2,0,0,0,0,36,36,37,37,43,37,37,105,105,104,101,101,10.223298359,11.073029264,11.907843645,8.7855297158,8.2858622475,10.978043912,10.069527691,3.8554216867,10.067114094,6.6571564432,2.6903416734,3.6910097548,5.1773233238,3.1007751938,3.6250647333,3.9920159681,4.3155118677,6.265060241,3.8350910834,0,7.5329566855,7.3820195096,6.730520321,5.684754522,4.6607975142,6.9860279441,5.7540158235,-2.409638554,6.2320230105,6.6571564432,10.223298359,8.9638808331,14.496505307,7.2351421189,11.910926981,18.962075848,20.618556701,4.3373493976,8.6289549377,6.6571564432,2.6903416734,2.6364355392,-2.588661662,-27.39018088,-7.250129467,36.926147705,-9.590026373,-28.91566265,22.531160115,-34.23680456,12.913640032,11.600316372,11.907843645,-20.15503876,4.6607975142,55.888223553,11.028530328,-24.57831325,31.160115053,-27.57964812 +050,4,9,02,070,Alaska,Dillingham Census Area,4847,4847,4850,4947,4948,4976,4981,4987,4968,4934,5003,4932,4833,3,97,1,28,5,6,-19,-34,69,-71,-99,19,110,99,105,90,98,111,104,86,90,81,17,37,39,27,38,36,34,32,31,47,54,2,73,60,78,52,62,77,72,55,43,27,0,0,1,0,0,1,1,0,0,0,1,2,23,-61,-51,-47,-56,-99,-106,13,-114,-126,2,23,-60,-51,-47,-55,-98,-106,13,-114,-125,-1,1,1,1,0,-1,2,0,1,0,-1,52,52,52,52,52,52,52,48,52,52,52,52,22.455853833,20.010106114,21.160822249,18.077734257,19.662921348,22.300351582,21.005857403,17.309046996,18.117765476,16.589861751,7.5533326529,7.8827690753,5.4413542926,7.6328211309,7.2231139647,6.8307383225,6.4633407392,6.2393076381,9.4614997484,11.059907834,14.90252118,12.127337039,15.719467956,10.444913126,12.439807384,15.46961326,14.542516663,11.069739358,8.6562657272,5.5299539171,0,0.202122284,0,0,0.2006420546,0.2009040683,0,0,0,0.204813108,4.6953148923,-12.32945932,-10.27811366,-9.440594557,-11.23595506,-19.88950276,-21.4098162,2.6164838482,-22.9491696,-25.80645161,4.6953148923,-12.12733704,-10.27811366,-9.440594557,-11.035313,-19.68859869,-21.4098162,2.6164838482,-22.9491696,-25.6016385 +050,4,9,02,090,Alaska,Fairbanks North Star Borough,97581,97585,98272,98151,100388,101046,99404,99812,100877,99911,98749,97088,95651,687,-121,2237,658,-1642,408,1065,-966,-1162,-1661,-1437,483,1775,1600,1712,1701,1698,1719,1614,1626,1433,1408,116,447,449,473,433,493,488,494,505,492,540,367,1328,1151,1239,1268,1205,1231,1120,1121,941,868,97,148,462,503,240,511,366,253,-6,74,88,196,-1610,570,-1073,-3235,-1314,-530,-2347,-2284,-2668,-2380,293,-1462,1032,-570,-2995,-803,-164,-2094,-2290,-2594,-2292,27,13,54,-11,85,6,-2,8,7,-8,-13,4313,4302,3173,4649,5023,4739,4877,4925,4824,4714,4818,4821,18.073239896,16.117740091,16.998123455,16.97181342,17.046823548,17.130983761,16.076657968,16.369676835,14.634619607,14.610431724,4.5514018216,4.5230408131,4.696327333,4.3202793714,4.9494016545,4.8632461171,4.9206127856,5.0840632236,5.0245867737,5.6034326213,13.521838074,11.594699278,12.301796122,12.651534048,12.097421894,12.267737644,11.156045182,11.285613611,9.6100328334,9.0069991024,1.5069518335,4.6539974514,4.9941916459,2.3946121227,5.1301100313,3.6474345878,2.5200709206,-0.060404712,0.755730531,0.9131519827,-16.39319224,5.7419449075,-10.65361359,-32.2773759,-13.19171151,-5.281804185,-23.37789111,-22.9940602,-27.24714942,-24.69661044,-14.88624041,10.395942359,-5.659421945,-29.88276378,-8.061601478,-1.634369597,-20.85782019,-23.05446491,-26.49141888,-23.78345846 +050,4,9,02,100,Alaska,Haines Borough,2508,2508,2501,2575,2580,2561,2558,2519,2531,2526,2502,2561,2614,-7,74,5,-19,-3,-39,12,-5,-24,59,53,2,30,26,13,19,18,15,19,25,21,19,10,16,24,20,21,17,18,11,14,12,5,-8,14,2,-7,-2,1,-3,8,11,9,14,1,13,13,1,1,1,6,3,0,1,1,1,46,-10,-12,-2,-42,10,-16,-35,48,39,2,59,3,-11,-1,-41,16,-13,-35,49,40,-1,1,0,-1,0,1,-1,0,0,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,11.820330969,10.087293889,5.0573818323,7.4233248681,7.0908016545,5.9405940594,7.5143365632,9.9443118536,8.2954769899,7.3429951691,6.3041765169,9.3113482056,7.7805874344,8.2047274858,6.6968682293,7.1287128713,4.3504053787,5.568814638,4.7402725657,1.9323671498,5.5161544523,0.7759456838,-2.723205602,-0.781402618,0.3939334253,-1.188118812,3.1639311845,4.3754972156,3.5552044243,5.4106280193,5.12214342,5.0436469447,0.3890293717,0.3907013088,0.3939334253,2.3762376238,1.1864741942,0,0.3950227138,0.38647343,18.124507486,-3.879728419,-4.668352461,-0.781402618,-16.54520386,3.9603960396,-6.327862369,-13.9220366,18.961090263,15.072463768,23.246650906,1.1639185257,-4.279323089,-0.390701309,-16.15127044,6.3366336634,-5.141388175,-13.9220366,19.356112976,15.458937198 +050,4,9,02,105,Alaska,Hoonah-Angoon Census Area,2150,2095,2100,2079,2107,2109,2091,2126,2115,2135,2139,2144,2141,5,-21,28,2,-18,35,-11,20,4,5,-3,4,32,17,19,27,18,18,29,6,25,19,0,17,13,8,11,23,14,14,16,10,23,4,15,4,11,16,-5,4,15,-10,15,-4,0,2,3,1,2,9,12,12,5,8,7,0,-37,20,-10,-37,31,-26,-8,8,-17,-6,0,-35,23,-9,-35,40,-14,4,13,-9,1,1,-1,1,0,1,0,-1,1,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,15.314668581,8.1223124701,9.0132827324,12.857142857,8.5368745554,8.4885640179,13.647058824,2.8076743098,11.674060238,8.8681446908,8.1359176837,6.2111801242,3.7950664137,5.2380952381,10.908228599,6.6022164584,6.5882352941,7.4871314927,4.6696240953,10.73512252,7.1787508973,1.9111323459,5.2182163188,7.619047619,-2.371354043,1.8863475595,7.0588235294,-4.679457183,7.0044361429,-1.86697783,0.9571667863,1.4333492594,0.4743833017,0.9523809524,4.2684372777,5.6590426786,5.6470588235,2.3397285915,3.7356992762,3.2672112019,-17.70758555,9.5556617296,-4.743833017,-17.61904762,14.702395068,-12.26125914,-3.764705882,3.7435657464,-7.938360962,-2.800466744,-16.75041876,10.989010989,-4.269449715,-16.66666667,18.970832345,-6.602216458,1.8823529412,6.0832943379,-4.202661686,0.4667444574 +050,4,9,02,110,Alaska,Juneau City and Borough,31275,31276,31387,32165,32391,32605,32501,32644,32456,32106,32044,32038,31849,111,778,226,214,-104,143,-188,-350,-62,-6,-189,101,410,365,400,406,382,382,356,331,324,315,61,157,184,181,178,200,203,181,205,167,200,40,253,181,219,228,182,179,175,126,157,115,8,68,86,107,45,94,86,101,27,41,35,61,454,-35,-108,-380,-132,-456,-632,-213,-205,-339,69,522,51,-1,-335,-38,-370,-531,-186,-164,-304,2,3,-6,-4,3,-1,3,6,-2,1,0,887,887,899,885,889,1029,1061,1038,973,987,992,995,12.902819738,11.308011649,12.308449751,12.471968789,11.727684396,11.735791091,11.028158979,10.319563523,10.112043944,9.8611611126,4.940835851,5.7004771051,5.5695735122,5.468006021,6.1401488986,6.2365591398,5.6070134135,6.3912704599,5.2120720327,6.2610546747,7.9619838872,5.6075345437,6.7388762385,7.0039627684,5.5875354977,5.4992319508,5.4211455655,3.9282930631,4.899971911,3.6001064379,2.139979859,2.6643534296,3.2925103083,1.3823610727,2.8858699823,2.6420890937,3.1287754407,0.841777085,1.279610499,1.0956845681,14.287512588,-1.084329884,-3.323281433,-11.67327128,-4.052498273,-14.00921659,-19.57807999,-6.640685892,-6.398052495,-10.61248767,16.427492447,1.5800235454,-0.030771124,-10.29091021,-1.166628291,-11.3671275,-16.44930454,-5.798908807,-5.118441996,-9.516803105 +050,4,9,02,122,Alaska,Kenai Peninsula Borough,55400,55397,55554,56311,56920,57039,57594,58075,58515,58594,58609,58914,59414,157,757,609,119,555,481,440,79,15,305,500,183,711,716,714,711,702,748,696,704,674,680,108,389,346,393,393,442,481,436,485,475,550,75,322,370,321,318,260,267,260,219,199,130,7,28,32,88,28,66,68,93,27,44,35,75,407,209,-294,211,159,106,-274,-229,61,335,82,435,241,-206,239,225,174,-181,-202,105,370,0,0,-2,4,-2,-4,-1,0,-2,1,0,1722,1722,1717,1729,1575,1740,1722,1689,1646,1691,1705,1704,12.711750771,12.646713356,12.530822489,12.404804899,12.13808367,12.831289133,11.886362278,12.013344368,11.470095215,11.493475762,6.9548116033,6.1114005882,6.8972174203,6.8566643113,7.6424971254,8.2511364611,7.4460545304,8.2762386628,8.0835240761,9.2961936313,5.7569391677,6.5353127677,5.6336050685,5.5481405878,4.4955865444,4.5801526718,4.4403077475,3.7371057055,3.3865711393,2.197282131,0.5006034059,0.5652162394,1.5444150967,0.4885155235,1.1411873536,1.1664808303,1.5882639251,0.4607390596,0.7487895986,0.5915759584,7.2766280785,3.6915685634,-5.159750437,3.6813134089,2.7492240791,1.8183377648,-4.679401242,-3.907749802,1.0380946708,5.66222703,7.7772314844,4.2567848027,-3.61533534,4.1698289323,3.8904114326,2.9848185951,-3.091137317,-3.447010742,1.7868842695,6.2538029883 +050,4,9,02,130,Alaska,Ketchikan Gateway Borough,13477,13534,13584,13688,13743,13748,13826,13737,13760,13874,13881,13905,13747,50,104,55,5,78,-89,23,114,7,24,-158,43,188,188,173,175,166,167,138,162,133,135,14,104,110,84,94,102,85,97,106,80,101,29,84,78,89,81,64,82,41,56,53,34,4,40,57,57,23,41,44,61,25,36,26,15,-19,-80,-142,-24,-197,-104,13,-74,-65,-217,19,21,-23,-85,-1,-156,-60,74,-49,-29,-191,2,-1,0,1,-2,3,1,-1,0,0,-1,246,246,284,276,285,283,286,277,260,280,265,264,13.787034321,13.707119682,12.585937216,12.693116704,12.045132968,12.146779649,9.9876963161,11.673572329,9.5731663428,9.7642123535,7.6268700499,8.0201232183,6.1110909025,6.8180169725,7.4012262816,6.1824926356,7.0203372657,7.638263376,5.7582955445,7.3050773904,6.160164271,5.6869964639,6.4748463133,5.8750997316,4.6439066865,5.9642870131,2.9673590504,4.0353089533,3.8148707982,2.4591349631,2.9334115576,4.1558820313,4.1468116838,1.6682381954,2.975002721,3.200349129,4.4148512702,1.8014772113,2.591232995,1.8805149718,-1.39337049,-5.832816886,-10.33065367,-1.740770291,-14.29452527,-7.564461578,0.9408699428,-5.332372545,-4.67861513,-15.69506726,1.5400410678,-1.676934855,-6.183841985,-0.072532095,-11.31952255,-4.364112449,5.355721213,-3.530895334,-2.087382135,-13.81455229 +050,4,9,02,150,Alaska,Kodiak Island Borough,13592,13606,13653,13807,14037,14091,13899,13760,13722,13605,13389,13209,12992,47,154,230,54,-192,-139,-38,-117,-216,-180,-217,66,219,218,222,238,221,201,194,181,143,145,11,62,66,57,62,60,48,63,67,56,64,55,157,152,165,176,161,153,131,114,87,81,30,46,114,122,59,107,119,201,54,105,83,-38,-49,-39,-238,-438,-413,-312,-452,-385,-372,-379,-8,-3,75,-116,-379,-306,-193,-251,-331,-267,-296,0,0,3,5,11,6,2,3,1,0,-2,350,350,350,345,368,390,391,386,385,390,387,388,15.950473416,15.658669731,15.784982935,17.006073598,15.980331899,14.62775635,14.198411827,13.410387494,10.752688172,11.068279837,4.5156591406,4.7406981755,4.0529010239,4.4301536263,4.3385516468,3.4931955462,4.6108244593,4.9640660888,4.2108429205,4.885309721,11.434814275,10.917971556,11.732081911,12.575919971,11.641780252,11.134560803,9.5875873678,8.4463214048,6.5418452515,6.1829701156,3.3503277495,8.1884786669,8.6746302617,4.2157913541,7.7370837702,8.6602139582,14.710725656,4.0008890865,7.895330476,6.3356360444,-3.568827385,-2.801321649,-16.92263936,-31.29689175,-29.86369717,-22.70577105,-33.0808358,-28.52485738,-27.97202797,-28.9301935,-0.218499636,5.3871570177,-8.248009101,-27.08110039,-22.1266134,-14.04555709,-18.37011015,-24.52396829,-20.0766975,-22.59455746 +050,4,9,02,158,Alaska,Kusilvak Census Area,7459,7459,7469,7656,7800,7980,8107,8201,8180,8247,8349,8384,8328,10,187,144,180,127,94,-21,67,102,35,-56,57,245,242,227,236,222,217,233,235,243,234,8,63,57,68,52,53,62,69,60,82,109,49,182,185,159,184,169,155,164,175,161,125,0,3,0,5,3,14,16,21,11,12,10,-42,3,-42,17,-61,-91,-192,-119,-84,-139,-189,-42,6,-42,22,-58,-77,-176,-98,-73,-127,-179,3,-1,1,-1,1,2,0,1,0,1,-2,9,9,10,10,18,31,16,18,9,13,9,9,32.396694215,31.314699793,28.770595691,29.340461242,27.225901398,26.494109029,28.367930846,28.320077127,29.044403275,28.003829584,8.3305785124,7.3757763975,8.618504436,6.4648473923,6.4998773608,7.5697454368,8.4008035551,7.2306579899,9.8009920516,13.044518909,24.066115702,23.938923395,20.152091255,22.87561385,20.726024037,18.924363592,19.96712729,21.089419137,19.243411223,14.959310675,0.3966942149,0,0.6337135615,0.3729719649,1.7169487368,1.9534826934,2.5567662994,1.3256206315,1.4342915198,1.196744854,0.3966942149,-5.434782609,2.154626109,-7.583763287,-11.16016679,-23.44179232,-14.48834236,-10.12292119,-16.61387677,-22.61847774,0.7933884298,-5.434782609,2.7883396705,-7.210791322,-9.443218052,-21.48830963,-11.93157606,-8.797300554,-15.17958525,-21.42173289 +050,4,9,02,164,Alaska,Lake and Peninsula Borough,1631,1635,1641,1652,1651,1670,1648,1597,1595,1606,1586,1583,1493,6,11,-1,19,-22,-51,-2,11,-20,-3,-90,12,22,37,22,39,32,31,40,36,24,26,1,11,15,9,12,19,12,18,8,8,16,11,11,22,13,27,13,19,22,28,16,10,0,1,2,7,2,7,4,3,1,1,0,-5,0,-27,-2,-51,-72,-25,-15,-49,-21,-98,-5,1,-25,5,-49,-65,-21,-12,-48,-20,-98,0,-1,2,1,0,1,0,1,0,1,-2,37,37,37,37,37,37,37,37,37,37,37,37,13.361676283,22.403875265,13.249021379,23.508137432,19.722650231,19.423558897,24.992189941,22.556390977,15.146733985,16.905071521,6.6808381415,9.0826521344,5.4200542005,7.2332730561,11.710323575,7.5187969925,11.246485473,5.0125313283,5.0489113285,10.403120936,6.6808381415,13.32122313,7.8289671786,16.274864376,8.0123266564,11.904761905,13.745704467,17.543859649,10.097822657,6.5019505852,0.607348922,1.2110202846,4.2155977115,1.2055455093,4.3143297381,2.5062656642,1.8744142455,0.626566416,0.6311139161,0,0,-16.34877384,-1.204456489,-30.74141049,-44.37596302,-15.6641604,-9.372071228,-30.70175439,-13.25339224,-63.71911573,0.607348922,-15.13775356,3.0111412225,-29.53586498,-40.06163328,-13.15789474,-7.497656982,-30.07518797,-12.62227832,-63.71911573 +050,4,9,02,170,Alaska,Matanuska-Susitna Borough,88995,88981,89731,91741,93718,95940,98185,101162,104258,106426,107325,108578,110213,750,2010,1977,2222,2245,2977,3096,2168,899,1253,1635,321,1338,1315,1348,1379,1511,1541,1426,1376,1379,1372,100,519,520,557,523,584,614,582,617,675,721,221,819,795,791,856,927,927,844,759,704,651,13,24,79,120,73,100,111,170,55,70,73,482,1162,1080,1275,1295,1930,2052,1156,86,477,912,495,1186,1159,1395,1368,2030,2163,1326,141,547,985,34,5,23,36,21,20,6,-2,-1,2,-1,1370,1370,1368,1322,2158,2493,2410,2286,2078,2020,2101,2101,14.74607653,14.181031926,14.215060794,14.207340631,15.159495754,15.003407653,13.536860891,12.874793568,12.774255105,12.541649337,5.7198906718,5.6077084423,5.8737306098,5.3882807469,5.8591300596,5.9779963003,5.5248618785,5.7730724067,6.252807974,6.5907647024,9.0261858579,8.5733234839,8.3413301838,8.8190598841,9.300365694,9.0254113524,8.0119990127,7.1017211615,6.5214471314,5.9508846342,0.2645036149,0.851940321,1.265435679,0.7520927238,1.0032756951,1.0807126862,1.6137912703,0.5146174755,0.6484393454,0.6673034997,12.806383354,11.646779072,13.445254089,13.341918867,19.363220916,19.978580469,10.973780638,0.804674598,4.4186509683,8.3367231742,13.070886969,12.498719394,14.710689768,14.09401159,20.366496611,21.059293155,12.587571909,1.3192920735,5.0670903137,9.0040266739 +050,4,9,02,180,Alaska,Nome Census Area,9492,9492,9543,9775,9825,9851,9812,9901,9983,10038,10073,10040,9909,51,232,50,26,-39,89,82,55,35,-33,-131,55,262,254,204,199,245,223,222,186,163,167,29,89,72,64,65,56,71,72,84,90,113,26,173,182,140,134,189,152,150,102,73,54,0,4,4,9,5,9,8,11,3,5,4,22,55,-139,-124,-182,-109,-78,-104,-69,-111,-189,22,59,-135,-115,-177,-100,-70,-93,-66,-106,-185,3,0,3,1,4,0,0,-2,-1,0,0,219,219,191,197,190,187,168,186,174,181,186,188,27.124961176,25.918367347,20.735921935,20.241061893,24.856693552,22.430094548,22.17671445,18.497339764,16.208422413,16.742693869,9.214204369,7.3469387755,6.5053872738,6.6114021258,5.6815299549,7.1414202374,7.1924479297,8.3536373129,8.9494356884,11.328888666,17.910756807,18.571428571,14.230534662,13.629659767,19.175163598,15.288674311,14.98426652,10.143702451,7.258986725,5.4138052033,0.4141215447,0.4081632653,0.9148200854,0.5085693943,0.9131030285,0.804667069,1.0988462115,0.2983441897,0.4971908716,0.4010226076,5.6941712393,-14.18367347,-12.60418784,-18.51192595,-11.05869223,-7.845503923,-10.38909145,-6.861916364,-11.03763735,-18.94831821,6.1082927839,-13.7755102,-11.68936776,-18.00335656,-10.14558921,-7.040836854,-9.290245242,-6.563572174,-10.54044648,-18.5472956 +050,4,9,02,185,Alaska,North Slope Borough,9430,9018,9067,9145,9287,9383,9370,9382,9292,9401,9455,9433,9294,49,78,142,96,-13,12,-90,109,54,-22,-139,49,174,175,177,173,172,155,163,162,144,144,5,45,33,50,45,44,63,64,36,47,71,44,129,142,127,128,128,92,99,126,97,73,2,20,23,21,13,7,18,17,0,5,7,3,-71,-23,-52,-157,-124,-202,-7,-74,-125,-218,5,-51,0,-31,-144,-117,-184,10,-74,-120,-211,0,0,0,0,3,1,2,0,2,1,-1,2240,2240,2241,2240,2240,2238,2240,2239,2240,2239,2239,2240,19.108280255,18.988715278,18.960899839,18.450381272,18.344709898,16.600621185,17.439683304,17.182859567,15.247776366,15.378864741,4.9417966176,3.5807291667,5.3561863953,4.7992321229,4.6928327645,6.7473492556,6.847483015,3.8184132372,4.9767047861,7.5826346986,14.166483637,15.407986111,13.604713444,13.651149149,13.651877133,9.8532719289,10.592200289,13.36444633,10.27107158,7.7962300422,2.1963540523,2.4956597222,2.249598286,1.3864448355,0.7465870307,1.927814073,1.8188626759,0,0.5294366794,0.7475837027,-7.797056886,-2.495659722,-5.570433851,-16.74398763,-13.22525597,-21.63435793,-0.748943455,-7.848960543,-13.23591698,-23.28189245,-5.600702833,0,-3.320835565,-15.35754279,-12.47866894,-19.70654386,1.0699192211,-7.848960543,-12.7064803,-22.53430875 +050,4,9,02,188,Alaska,Northwest Arctic Borough,7523,7523,7562,7711,7715,7735,7785,7787,7709,7805,7715,7673,7644,39,149,4,20,50,2,-78,96,-90,-42,-29,57,214,183,195,178,159,181,193,150,175,158,1,44,56,38,39,45,56,59,57,73,89,56,170,127,157,139,114,125,134,93,102,69,1,6,2,6,14,9,9,9,4,5,5,-18,-27,-129,-144,-106,-122,-212,-47,-188,-150,-102,-17,-21,-127,-138,-92,-113,-203,-38,-184,-145,-97,0,0,4,1,3,1,0,0,1,1,-1,382,382,386,386,386,385,385,384,401,399,400,400,28.023309108,23.726176585,25.242718447,22.93814433,20.421268944,23.360867321,24.880752868,19.329896907,22.744996101,20.630671803,5.7618018726,7.2604693375,4.9190938511,5.0257731959,5.7796044182,7.2276716572,7.6060332603,7.3453608247,9.4879126592,11.621074623,22.261507235,16.465707248,20.323624595,17.912371134,14.641664526,16.133195663,17.274719608,11.984536082,13.257083442,9.0095971796,0.7857002554,0.2593024763,0.7766990291,1.8041237113,1.1559208836,1.1615900878,1.1602423617,0.5154639175,0.6498570315,0.6528693608,-3.535651149,-16.72500972,-18.6407767,-13.65979381,-15.66914976,-27.36189985,-6.059043445,-24.22680412,-19.49571094,-13.31853496,-2.749950894,-16.46570725,-17.86407767,-11.8556701,-14.51322887,-26.20030976,-4.898801083,-23.71134021,-18.84585391,-12.6656656 +050,4,9,02,195,Alaska,Petersburg Borough,3815,3207,3219,3255,3276,3288,3256,3251,3262,3284,3256,3294,3296,12,36,21,12,-32,-5,11,22,-28,38,2,14,45,38,39,40,40,32,35,36,22,26,3,19,20,13,14,16,26,19,28,17,38,11,26,18,26,26,24,6,16,8,5,-12,1,8,15,17,5,6,13,22,9,11,10,0,3,-11,-32,-63,-36,-9,-16,-45,22,2,1,11,4,-15,-58,-30,4,6,-36,33,12,0,-1,-1,1,0,1,1,0,0,0,2,43,43,43,44,43,43,43,43,44,43,43,43,13.90176089,11.636809064,11.882998172,12.224938875,12.294452128,9.8265008445,10.693553315,11.009174312,6.7175572519,7.8907435508,5.8696323757,6.1246363497,3.9609993906,4.2787286064,4.9177808514,7.9840319361,5.8050717996,8.5626911315,5.1908396947,11.53262519,8.0321285141,5.5121727147,7.9219987812,7.9462102689,7.3766712771,1.8424689083,4.8884815154,2.4464831804,1.5267175573,-3.641881639,2.4714241582,4.5934772623,5.1797684339,1.5281173594,1.8441678193,3.9920159681,6.7216620837,2.752293578,3.358778626,3.0349013657,0.9267840593,-3.368549992,-9.750152346,-19.25427873,-11.06500692,-2.763703363,-4.888481515,-13.76146789,6.7175572519,0.6069802731,3.3982082175,1.2249272699,-4.570383912,-17.72616137,-9.220839096,1.2283126056,1.8331805683,-11.00917431,10.076335878,3.6418816388 +050,4,9,02,198,Alaska,Prince of Wales-Hyder Census Area,5559,6168,6211,6375,6421,6443,6461,6508,6521,6441,6372,6211,6147,43,164,46,22,18,47,13,-80,-69,-161,-64,18,83,87,81,71,77,81,59,78,57,64,3,47,35,40,53,31,62,59,62,61,57,15,36,52,41,18,46,19,0,16,-4,7,0,1,0,1,2,4,5,6,4,4,5,26,127,-6,-19,0,-3,-11,-85,-90,-160,-76,26,128,-6,-18,2,1,-6,-79,-86,-156,-71,2,0,0,-1,-2,0,0,-1,1,-1,0,50,50,50,50,50,50,50,50,50,50,50,50,13.189257906,13.597999375,12.593283582,11.00433974,11.87446989,12.43380152,9.1035334053,12.175134629,9.0598426448,10.357663052,7.4686159225,5.4704595186,6.2189054726,8.2145071296,4.7806307348,9.5172307928,9.1035334053,9.6776711153,9.6956210761,9.2247936559,5.7206419832,8.1275398562,6.3743781095,2.78983261,7.0938391549,2.9165707268,0,2.4974635136,-0.635778431,1.1328693963,0.1589067218,0,0.1554726368,0.3099814011,0.6168555787,0.7675186123,0.9257830582,0.6243658784,0.6357784312,0.809192426,20.181153663,-0.93779306,-2.9539801,0,-0.462641684,-1.688540947,-13.11525999,-14.04823226,-25.43113725,-12.29972487,20.340060385,-0.93779306,-2.798507463,0.3099814011,0.1542138947,-0.921022335,-12.18947693,-13.42386639,-24.79535882,-11.49053245 +050,4,9,02,220,Alaska,Sitka City and Borough,8881,8881,8880,8888,9022,8980,8845,8789,8744,8640,8555,8501,8405,-1,8,134,-42,-135,-56,-45,-104,-85,-54,-96,26,119,113,96,97,72,79,85,94,70,80,26,68,57,70,64,69,64,64,62,52,51,0,51,56,26,33,3,15,21,32,18,29,2,35,57,54,27,42,38,35,19,15,18,-2,-79,22,-126,-199,-101,-99,-160,-136,-86,-143,0,-44,79,-72,-172,-59,-61,-125,-117,-71,-125,-1,1,-1,4,4,0,1,0,0,-1,0,255,255,255,256,255,259,255,254,255,258,258,257,13.394867177,12.6186488,10.665481613,10.883590463,8.1660428717,9.0115781669,9.779107225,10.933410875,8.2082551595,9.4640955874,7.6542098154,6.365159129,7.7769136763,7.1809256662,7.8257910854,7.3005190213,7.3630924988,7.2113986624,6.0975609756,6.0333609369,5.7406573615,6.2534896706,2.8885679369,3.7026647966,0.3402517863,1.7110591456,2.4160147262,3.7220122129,2.1106941839,3.4307346504,3.9396668167,6.365159129,5.9993334074,3.0294530154,4.7635250085,4.3346831689,4.0266912103,2.2099447514,1.7589118199,2.1294215072,-8.892390815,2.4567280849,-13.99844462,-22.32819074,-11.45514347,-11.29299036,-18.40773125,-15.8185519,-10.08442777,-16.91707086,-4.952723998,8.8218872138,-7.99911121,-19.29873773,-6.691618464,-6.958307192,-14.38104004,-13.60860715,-8.325515947,-14.78764936 +050,4,9,02,230,Alaska,Skagway Municipality,968,968,968,961,998,1025,1054,1090,1132,1173,1172,1193,1179,0,-7,37,27,29,36,42,41,-1,21,-14,3,14,7,9,9,17,10,12,15,3,6,0,1,1,0,2,4,4,3,8,4,16,3,13,6,9,7,13,6,9,7,-1,-10,0,1,0,2,0,0,1,3,1,3,1,-4,-21,30,15,22,22,35,29,-10,19,-5,-4,-20,30,17,22,22,36,32,-9,22,-4,1,0,1,1,0,1,0,0,1,0,0,32,32,32,32,32,32,32,32,32,32,32,32,14.515292898,7.146503318,8.8976767177,8.658008658,15.858208955,9.00090009,10.412147505,12.793176972,2.5369978858,5.0590219224,1.0368066356,1.0209290454,0,1.924001924,3.7313432836,3.600360036,2.6030368764,6.8230277186,3.3826638478,13.490725126,13.478486262,6.1255742726,8.8976767177,6.734006734,12.126865672,5.400540054,7.8091106291,5.9701492537,-0.845665962,-8.431703204,1.0368066356,0,1.9772614928,0,0,0.900090009,2.6030368764,0.8528784648,2.5369978858,0.8431703204,-21.77293935,30.627871363,14.829461196,21.164021164,20.52238806,31.503150315,25.162689805,-8.528784648,16.067653277,-4.215851602,-20.73613271,30.627871363,16.806722689,21.164021164,20.52238806,32.403240324,27.765726681,-7.675906183,18.604651163,-3.372681282 +050,4,9,02,240,Alaska,Southeast Fairbanks Census Area,7029,7029,7064,7155,7180,6996,6937,6827,6853,6918,6946,6879,6957,35,91,25,-184,-59,-110,26,65,28,-67,78,45,123,129,97,111,124,86,105,109,99,96,19,39,37,47,46,57,45,53,37,48,48,26,84,92,50,65,67,41,52,72,51,48,0,18,36,27,9,32,22,50,43,16,23,10,-11,-107,-267,-136,-212,-37,-37,-87,-134,8,10,7,-71,-240,-127,-180,-15,13,-44,-118,31,-1,0,4,6,3,3,0,0,0,0,-1,369,369,383,372,370,369,369,373,374,369,364,364,17.300794711,17.99790722,13.68510158,15.933395536,18.018018018,12.573099415,15.249437223,15.724177726,14.321880651,13.876843018,5.4856178353,5.162190443,6.6309255079,6.6030287806,8.2824760244,6.5789473684,7.6973349793,5.3375649163,6.9439421338,6.9384215091,11.815176876,12.835716777,7.0541760722,9.3303667552,9.7355419936,5.9941520468,7.5521022438,10.38661281,7.3779385172,6.9384215091,2.5318236163,5.0226717824,3.809255079,1.2918969353,4.6498111014,3.216374269,7.2616367729,6.2031159838,2.3146473779,3.3246603064,-1.547225543,-14.92849669,-37.66930023,-19.52199813,-30.80499855,-5.409356725,-5.373611212,-12.55049048,-19.38517179,1.1564035849,0.984598073,-9.905824904,-33.86004515,-18.2301012,-26.15518745,-2.192982456,1.888025561,-6.347374495,-17.07052441,4.4810638913 +050,4,9,02,275,Alaska,Wrangell City and Borough,2369,2365,2373,2397,2424,2450,2441,2452,2493,2516,2521,2513,2510,8,24,27,26,-9,11,41,23,5,-8,-3,8,28,24,23,26,22,21,19,23,22,23,2,13,22,22,11,32,17,21,26,14,40,6,15,2,1,15,-10,4,-2,-3,8,-17,0,0,5,8,3,8,8,10,7,8,7,2,10,20,17,-27,13,28,18,0,-23,6,2,10,25,25,-24,21,36,28,7,-15,13,0,-1,0,0,0,0,1,-3,1,-1,1,19,19,19,19,17,17,17,19,19,13,17,17,11.740041929,9.9564405725,9.4378334017,10.631772644,8.992438177,8.4934277048,7.5863445798,9.1324200913,8.7405641637,9.1578737806,5.4507337526,9.1267371915,9.027492819,4.4980576569,13.079910076,6.8756319515,8.3849071671,10.323605321,5.5621771951,15.92673701,6.2893081761,0.829703381,0.4103405827,6.1337149867,-4.087471899,1.6177957533,-0.798562587,-1.191185229,3.1783869686,-6.768863229,0,2.0742584526,3.2827246615,1.2267429973,3.2699775189,3.2355915066,3.9928129367,2.7794322017,3.1783869686,2.7871789767,4.1928721174,8.2970338104,6.9757899056,-11.04068698,5.3137134682,11.324570273,7.1870632861,0,-9.137862535,2.3890105515,4.1928721174,10.371292263,10.258514567,-9.813943979,8.5836909871,14.56016178,11.179876223,2.7794322017,-5.959475566,5.1761895282 +050,4,9,02,282,Alaska,Yakutat City and Borough,662,662,662,657,665,652,655,637,615,610,600,576,637,0,-5,8,-13,3,-18,-22,-5,-10,-24,61,2,9,8,9,7,10,8,9,0,10,6,0,5,2,3,2,4,3,3,2,9,6,2,4,6,6,5,6,5,6,-2,1,0,1,5,4,1,1,1,3,2,2,2,2,-4,-14,-2,-21,-3,-26,-30,-13,-10,-26,60,-3,-9,2,-20,-2,-25,-27,-11,-8,-24,62,1,0,0,1,0,1,0,0,0,-1,-1,18,18,18,18,18,18,18,18,18,18,18,18,13.646702047,12.102874433,13.667425968,10.711553175,15.479876161,12.779552716,14.693877551,0,17.006802721,9.8928276999,7.5815011372,3.0257186082,4.555808656,3.0604437643,6.1919504644,4.7923322684,4.8979591837,3.305785124,15.306122449,9.8928276999,6.0652009098,9.0771558245,9.1116173121,7.6511094109,9.2879256966,7.9872204473,9.7959183673,-3.305785124,1.7006802721,0,7.5815011372,6.0514372163,1.5186028853,1.5302218822,1.5479876161,4.7923322684,3.2653061224,3.305785124,3.4013605442,3.2976092333,-21.22820318,-3.025718608,-31.89066059,-4.590665647,-40.24767802,-47.92332268,-21.2244898,-16.52892562,-44.21768707,98.928276999,-13.64670205,3.0257186082,-30.37205771,-3.060443764,-38.6996904,-43.13099042,-17.95918367,-13.2231405,-40.81632653,102.22588623 +050,4,9,02,290,Alaska,Yukon-Koyukuk Census Area,5588,5583,5607,5625,5616,5554,5456,5461,5418,5400,5375,5254,5077,24,18,-9,-62,-98,5,-43,-18,-25,-121,-177,21,96,86,91,84,89,82,84,70,77,78,9,55,61,62,59,52,59,65,48,58,69,12,41,25,29,25,37,23,19,22,19,9,0,2,2,4,0,3,3,0,0,0,0,13,-27,-37,-97,-126,-36,-69,-37,-48,-140,-185,13,-25,-35,-93,-126,-33,-66,-37,-48,-140,-185,-1,2,1,2,3,1,0,0,1,0,-1,31,31,31,31,31,31,31,31,31,50,49,49,17.094017094,15.301129793,16.293643688,15.258855586,16.304845654,15.074914974,15.529672768,12.993039443,14.488663092,15.100183912,9.7934472934,10.853126946,11.101163832,10.717529519,9.526426674,10.846585164,12.017008689,8.909512761,10.913538433,13.357855,7.3005698006,4.4480028467,5.1924798568,4.5413260672,6.7784189796,4.2283298097,3.5126640784,4.0835266821,3.575124659,1.742328913,0.3561253561,0.3558402277,0.7162041182,0,0.5496015389,0.5515212795,0,0,0,0,-4.807692308,-6.583044213,-17.36794987,-22.88828338,-6.595218467,-12.68498943,-6.8404511,-8.909512761,-26.3430238,-35.81453877,-4.451566952,-6.227203985,-16.65174575,-22.88828338,-6.045616928,-12.13346815,-6.8404511,-8.909512761,-26.3430238,-35.81453877 +040,4,8,04,000,Arizona,Arizona,6392017,6392292,6407342,6473416,6556344,6634690,6732873,6832810,6944767,7048088,7164228,7291843,7421401,15050,66074,82928,78346,98183,99937,111957,103321,116140,127615,129558,20951,86097,85581,86097,86129,86755,84736,83156,81134,81294,81451,11506,48173,48748,50612,50241,52843,56023,56320,59212,61049,66385,9445,37924,36833,35485,35888,33912,28713,26836,21922,20245,15066,2723,17104,15673,18580,21867,20141,20694,13662,8180,11618,9272,3110,11042,29856,24017,39905,45608,62460,62648,85777,95805,105434,5833,28146,45529,42597,61772,65749,83154,76310,93957,107423,114706,-228,4,566,264,523,276,90,175,261,-53,-214,139679,141560,147932,149945,147861,151057,156877,157365,154789,160092,161602,155824,13.368312641,13.136235817,13.05386674,12.886268051,12.790362269,12.300566348,11.885494418,11.417421341,11.247039393,11.071793549,7.4798393076,7.4825629943,7.6736971491,7.5168525482,7.7906877228,8.1324894791,8.0498225702,8.3324913406,8.4461400335,9.0238427365,5.8884733336,5.6536728228,5.380169591,5.3694155023,4.9996745464,4.1680768687,3.8356718482,3.0849300001,2.8008993592,2.0479508122,2.6557443281,2.4057235129,2.8170649852,3.2716509359,2.9694044893,3.0040115181,1.9527108657,1.1511142871,1.6073523712,1.2603610733,1.7144953736,4.5827398202,3.641412796,5.9704225819,6.7240256167,9.0669063218,8.9542841686,12.070798313,13.25463883,14.331849591,4.3702397017,6.9884633332,6.4584777812,9.2420735178,9.693430106,12.07091784,10.906995034,13.2219126,14.861991201,15.592210664 +050,4,8,04,001,Arizona,Apache County,71518,71514,71828,72181,72231,72333,71808,71026,71418,71538,71819,71920,71875,314,353,50,102,-525,-782,392,120,281,101,-45,278,1074,985,996,977,961,1020,969,935,901,891,89,595,519,531,601,611,676,654,691,740,774,189,479,466,465,376,350,344,315,244,161,117,6,31,52,90,78,73,50,41,33,32,29,115,-154,-466,-453,-1001,-1216,3,-235,7,-93,-194,121,-123,-414,-363,-923,-1143,53,-194,40,-61,-165,4,-3,-2,0,22,11,-5,-1,-3,1,3,941,1005,998,913,991,942,964,992,911,931,955,953,14.915734433,13.641525635,13.779364157,13.556170694,13.456179901,14.32141754,13.55661882,13.044357792,12.536611497,12.392642303,8.2633724281,7.1877683295,7.3462272765,8.3390568957,8.5553859725,9.4914492713,9.1496684294,9.6402686998,10.296440075,10.765325637,6.6523620052,6.4537573055,6.4331368806,5.2171137983,4.9007939286,4.8299682682,4.4069503903,3.4040890923,2.2401714218,1.6273166661,0.4305286475,0.7201617594,1.2451232672,1.0822736071,1.0221655908,0.7020302715,0.5736030667,0.4603890985,0.4452514627,0.4033519942,-2.138755217,-6.453757305,-6.267120445,-13.88917796,-17.02675833,0.0421218163,-3.287724894,0.0976582936,-1.294012064,-2.698285754,-1.708226569,-5.733595546,-5.021997178,-12.80690435,-16.00459274,0.7441520878,-2.714121828,0.5580473922,-0.848760601,-2.29493376 +050,4,8,04,003,Arizona,Cochise County,131346,131359,131823,133124,132085,129664,127437,126594,125885,125048,126581,127248,127450,464,1301,-1039,-2421,-2227,-843,-709,-837,1533,667,202,397,1770,1689,1631,1682,1605,1550,1412,1343,1376,1335,266,1217,1218,1269,1244,1250,1338,1330,1404,1387,1442,131,553,471,362,438,355,212,82,-61,-11,-107,103,302,532,364,309,488,224,128,65,115,115,233,446,-2082,-3237,-3061,-1699,-1140,-1050,1522,568,191,336,748,-1550,-2873,-2752,-1211,-916,-922,1587,683,306,-3,0,40,90,87,13,-5,3,7,-5,3,6282,6264,6787,7016,5918,5079,5076,5300,4895,5776,5542,5393,13.361162799,12.737124306,12.462320773,13.084352064,12.636253056,12.278248884,11.254000072,10.674445314,10.841944774,10.4830034,9.186743009,9.1852086468,9.6963121158,9.6771307774,9.8413185792,10.598901295,10.600439161,11.159286092,10.928617297,11.32321416,4.1744197896,3.551915659,2.7660086571,3.4072212866,2.7949344765,1.6793475893,0.6535609107,-0.484840777,-0.086672524,-0.840210759,2.2797012233,4.0119302135,2.7812904729,2.4037246063,3.8420507733,1.774405,1.0201926411,0.5166336154,0.9061218379,0.9030302554,3.3667110781,-15.70082463,-24.73361885,-23.81165379,-13.37632021,-9.030454018,-8.368767759,12.097174809,4.4754539473,1.4998154677,5.6464123013,-11.68889442,-21.95232838,-21.40792918,-9.53426944,-7.256049018,-7.348575118,12.613808424,5.3815757853,2.4028457232 +050,4,8,04,005,Arizona,Coconino County,134421,134435,134624,134309,136204,136788,137675,139100,140609,141300,142914,143967,142481,189,-315,1895,584,887,1425,1509,691,1614,1053,-1486,428,1801,1725,1682,1666,1675,1564,1594,1503,1442,1440,165,723,726,739,711,784,831,883,869,886,963,263,1078,999,943,955,891,733,711,634,556,477,41,159,180,282,328,161,267,148,75,101,86,-103,-1562,672,-627,-372,371,506,-165,897,391,-2049,-62,-1403,852,-345,-44,532,773,-17,972,492,-1963,-12,10,44,-14,-24,2,3,-3,8,5,0,8834,8844,8594,10143,10113,10534,11169,11498,11582,12367,13634,11916,13.393670542,12.75354604,12.322705427,12.140069882,12.103694337,11.183050957,11.308613773,10.576537398,10.052948784,10.054180864,5.376803888,5.367579377,5.4140780682,5.1810262221,5.6652515581,5.9418896067,6.2644328489,6.1151104449,6.1767771306,6.7237334525,8.0168666545,7.3859666633,6.908627359,6.9590436598,6.4384427784,5.2411613498,5.0441809236,4.4614269529,3.8761716531,3.330447411,1.1824506476,1.3308048042,2.0659946079,2.3901218015,1.1633998735,1.9091269855,1.0499842148,0.5277713272,0.7041247068,0.6004580238,-11.61627617,4.9683379357,-4.593541203,-2.710747897,2.6808779695,3.6180458977,-1.17059051,6.3121450738,2.7258689143,-14.30626152,-10.43382553,6.2991427399,-2.527546595,-0.320626095,3.844277843,5.5271728832,-0.120606295,6.839916401,3.429993621,-13.7058035 +050,4,8,04,007,Arizona,Gila County,53597,53592,53565,53445,53009,53026,53074,53020,53400,53619,53833,54077,54303,-27,-120,-436,17,48,-54,380,219,214,244,226,166,659,592,604,623,608,583,592,519,490,481,207,687,698,670,742,784,828,799,758,804,910,-41,-28,-106,-66,-119,-176,-245,-207,-239,-314,-429,7,27,32,31,39,34,28,19,9,14,17,12,-116,-357,56,135,94,599,409,444,547,644,19,-89,-325,87,174,128,627,428,453,561,661,-5,-3,-5,-4,-7,-6,-2,-2,0,-3,-6,917,966,937,928,938,930,923,999,953,920,906,846,12.316605925,11.122174836,11.392464752,11.743638077,11.461534111,10.956587108,11.063456022,9.6601273127,9.0816421092,8.8761764163,12.839921503,13.11364533,12.637336728,13.986804901,14.779346617,15.560984777,14.931927975,14.108625247,14.901306644,16.792766193,-0.523315578,-1.991470494,-1.244871976,-2.243166824,-3.317812506,-4.60439767,-3.868471954,-4.448497934,-5.819664535,-7.916589777,0.5046257359,0.6011986398,0.5847125949,0.7351555137,0.6409410523,0.5262168765,0.3550771358,0.1675166586,0.2594754888,0.3137110168,-2.16802168,-6.707122325,1.0562550101,2.5447690858,1.7720134975,11.257282466,7.6435025556,8.2641551577,10.138078028,11.88411146,-1.663395944,-6.105923685,1.640967605,3.2799245994,2.4129545497,11.783499342,7.9985796915,8.4316718163,10.397553517,12.197822476 +050,4,8,04,009,Arizona,Graham County,37220,37212,37154,37129,37027,37456,38123,37888,37859,37530,38032,38890,39211,-58,-25,-102,429,667,-235,-29,-329,502,858,321,125,558,530,594,639,574,578,545,512,508,514,46,283,269,302,275,279,287,276,328,304,321,79,275,261,292,364,295,291,269,184,204,193,2,4,14,45,61,91,49,44,35,51,40,-145,-305,-392,97,241,-627,-370,-646,285,604,86,-143,-301,-378,142,302,-536,-321,-602,320,655,126,6,1,15,-5,1,6,1,4,-2,-1,2,3751,3767,3702,3322,3230,3320,3231,3127,2802,2714,2915,2831,15.023625863,14.294190625,15.94994831,16.909458977,15.103077186,15.261330482,14.458342729,13.551785289,13.208184915,13.162443503,7.6195091744,7.2549759965,8.1092329793,7.2771537067,7.3410427438,7.577857869,7.3220231068,8.6816124507,7.9041106575,8.2201252225,7.4041166889,7.0392146286,7.840715331,9.63230527,7.7620344424,7.6834726128,7.1363196222,4.8701728382,5.304074257,4.9423182802,0.1076962427,0.3775823939,1.2083294175,1.614205004,2.3943902856,1.2937806118,1.167279046,0.9263915725,1.3260185643,1.0243146695,-8.211838509,-10.57230703,2.6046211887,6.3774328848,-16.49761219,-9.769363803,-17.13777872,7.5434742331,15.704219859,2.2022765394,-8.104142267,-10.19472463,3.8129506062,7.9916378888,-14.1032219,-8.475583191,-15.97049968,8.4698658056,17.030238423,3.2265912088 +050,4,8,04,011,Arizona,Greenlee County,8437,8444,8342,8587,8764,8918,9356,9587,9642,9451,9424,9467,9341,-102,245,177,154,438,231,55,-191,-27,43,-126,21,112,124,106,140,164,140,157,143,121,123,27,52,83,55,47,54,70,58,75,37,57,-6,60,41,51,93,110,70,99,68,84,66,2,26,17,21,22,19,11,12,10,10,11,-105,158,116,79,311,103,-26,-304,-104,-52,-202,-103,184,133,100,333,122,-15,-292,-94,-42,-191,7,1,3,3,12,-1,0,2,-1,1,-1,35,37,35,35,35,35,35,35,35,34,34,35,13.23173253,14.293124316,11.989593937,15.322315859,17.315103204,14.561339643,16.445817839,15.152317881,12.810332963,13.079540621,6.1433043889,9.5671719209,6.2210157222,5.143920324,5.7013144697,7.2806698216,6.0755250615,7.9470198675,3.9172092531,6.0612505317,7.0884281411,4.7259523947,5.7685782151,10.178395535,11.613788735,7.2806698216,10.370292777,7.2052980132,8.8931237097,7.0182900893,3.0716521945,1.9595412368,2.3752969121,2.4077924921,2.0060180542,1.1441052577,1.2570051851,1.059602649,1.0587052035,1.1697150149,18.666194105,13.370987263,8.9356407646,34.037430229,10.874729452,-2.704248791,-31.84413136,-11.01986755,-5.505267058,-21.48022118,21.737846299,15.3305285,11.310937677,36.445222721,12.880747506,-1.560143533,-30.58712617,-9.960264901,-4.446561855,-20.31050617 +050,4,8,04,012,Arizona,La Paz County,20489,20489,20499,20606,20524,20526,20521,20476,20670,20737,21030,21257,21480,10,107,-82,2,-5,-45,194,67,293,227,223,44,196,184,202,214,214,205,204,210,173,188,25,199,218,257,246,269,268,292,348,289,330,19,-3,-34,-55,-32,-55,-63,-88,-138,-116,-142,3,50,38,49,81,119,88,76,58,80,71,-9,62,-84,10,-49,-108,171,82,373,268,295,-6,112,-46,59,32,11,259,158,431,348,366,-3,-2,-2,-2,-5,-1,-2,-3,0,-5,-1,388,364,415,333,390,400,399,355,302,388,372,361,9.5365527308,8.9472404571,9.8416565164,10.427071406,10.439788277,9.9645165994,9.8534064289,10.055785668,8.1821836498,8.7979970517,9.6825203747,10.600534889,12.521315469,11.986259654,13.122911433,13.026782676,14.103895477,16.663873393,13.668503323,15.443292697,-0.145967644,-1.653294432,-2.679658952,-1.559188248,-2.683123155,-3.062266077,-4.250489048,-6.608087725,-5.486319673,-6.645295645,2.432794064,1.8477996596,2.3873325213,3.9466952518,5.805302827,4.277451028,3.6708769049,2.7773122321,3.7836687398,3.3226478227,3.0166646393,-4.084609774,0.4872107186,-2.387507004,-5.268678196,8.3118650659,3.9606829763,17.860990734,12.675290278,13.805367714,5.4494587033,-2.236810114,2.87454324,1.5591882476,0.5366246311,12.589316094,7.6315598812,20.638302966,16.458959018,17.128015537 +050,4,8,04,013,Arizona,Maricopa County,3817117,3817371,3825183,3875371,3948165,4018657,4094842,4174423,4258019,4329227,4405306,4492261,4579081,7812,50188,72794,70492,76185,79581,83596,71208,76079,86955,86820,13121,53379,54290,54621,54619,55664,54438,53252,52001,52375,52573,6315,25930,26038,27400,27074,28481,30340,30352,32276,33085,36247,6806,27449,28252,27221,27545,27183,24098,22900,19725,19290,16326,1868,11929,10444,12495,14856,12903,14692,9690,5844,7754,6185,-458,10836,33545,30514,33417,39284,44692,38523,50310,59870,64403,1410,22765,43989,43009,48273,52187,59384,48213,56154,67624,70588,-404,-26,553,262,367,211,114,95,200,41,-94,53416,53337,53119,54478,56020,58901,63476,64500,62279,65205,67116,65297,13.86367786,13.878634929,13.71211758,13.463734943,13.4628652,12.911562273,12.40257936,11.906990334,11.772881283,11.591008254,6.7345803951,6.6563252217,6.878526971,6.6738160688,6.8883993922,7.1960174763,7.0690882735,7.3904351841,7.4368644822,7.9915408327,7.1290974649,7.2223097075,6.8335906087,6.7899188747,6.574465808,5.7155447971,5.3334910867,4.5165551495,4.336016801,3.5994674217,3.0982186476,2.6698924885,3.1367589234,3.6620451916,3.1207126631,3.4846370719,2.2568353113,1.3381367956,1.7429483813,1.3636350608,2.8143429681,8.5754063124,7.6602690508,8.2373831561,9.501207181,10.600013614,8.9721431062,11.519791613,13.457611502,14.199222122,5.9125616157,11.245298801,10.797027974,11.899428348,12.621919844,14.084650686,11.228978418,12.857928409,15.200559883,15.562857183 +050,4,8,04,015,Arizona,Mohave County,200186,200181,200336,202888,203484,203322,203670,204890,205899,207668,210371,213846,217206,155,2552,596,-162,348,1220,1009,1769,2703,3475,3360,493,2011,1868,1746,1786,1852,1812,1789,1757,1793,1780,571,2374,2575,2646,2520,2865,3119,3187,3318,3417,3656,-78,-363,-707,-900,-734,-1013,-1307,-1398,-1561,-1624,-1876,-23,5,-90,-53,-72,-80,7,-54,-106,-68,-62,257,2898,1369,798,1152,2301,2309,3214,4361,5183,5322,234,2903,1279,745,1080,2221,2316,3160,4255,5115,5260,-1,12,24,-7,2,12,0,7,9,-16,-24,2629,2652,4089,4665,4724,4807,4822,4583,4467,4643,4757,4152,9.9746046862,9.1935467995,8.5839441896,8.7765852891,9.0659878598,8.8220473284,8.6515606903,8.4059142807,8.4532208752,8.2588643598,11.775092752,12.673117242,13.008657689,12.383535794,14.024867828,15.185411489,15.412254846,15.874117008,16.109679716,16.963150618,-1.800488066,-3.479570443,-4.4247135,-3.606950505,-4.958879969,-6.36336416,-6.760694156,-7.468202727,-7.656458841,-8.704286258,0.0248001111,-0.442943904,-0.260566462,-0.353815308,-0.391619346,0.0340807568,-0.261142693,-0.507129718,-0.320590641,-0.287668309,14.374144396,6.7376689339,3.9232459698,5.6610449345,11.263951439,11.24178106,15.542826193,20.864082059,24.435607248,24.693076473,14.398944507,6.2947250303,3.6626795082,5.3072296261,10.872332093,11.275861817,15.2816835,20.356952342,24.115016607,24.405408164 +050,4,8,04,017,Arizona,Navajo County,107449,107488,107693,107560,107334,107164,107741,107695,108569,109145,110490,111037,112112,205,-133,-226,-170,577,-46,874,576,1345,547,1075,454,1739,1607,1625,1540,1570,1555,1456,1491,1376,1363,203,886,913,987,895,956,963,1018,1122,1230,1227,251,853,694,638,645,614,592,438,369,146,136,6,42,43,69,97,86,89,66,54,75,55,-38,-1030,-981,-881,-144,-745,200,79,925,326,884,-32,-988,-938,-812,-47,-659,289,145,979,401,939,-14,2,18,4,-21,-1,-7,-7,-3,0,0,2272,2323,2304,2074,2176,2245,2236,2288,2059,2010,1917,2214,16.15773067,14.956210969,15.151656426,14.331914102,14.575094228,14.380571894,13.375345637,13.57707105,12.422864933,12.216052951,8.232173303,8.4972125792,9.2028830106,8.3292617668,8.8750255296,8.9057818222,9.3517183093,10.21695085,11.104741183,10.997136442,7.9255573674,6.4589983899,5.9487734151,6.0026523348,5.7000686979,5.4747900714,4.0236273276,3.3601201994,1.3181237502,1.2189165087,0.3902384636,0.4001973066,0.6433626421,0.9027244596,0.7983809577,0.8230681019,0.6063000083,0.4917249072,0.6771183648,0.4929441763,-9.57013375,-9.130082738,-8.214528807,-1.340127033,-6.916207133,1.8495912403,0.7257227372,8.4230655406,2.9432078257,7.9229573066,-9.179895286,-8.729885432,-7.571166165,-0.437402573,-6.117826176,2.6726593423,1.3320227454,8.9147904478,3.6203261905,8.4159014829 +050,4,8,04,019,Arizona,Pima County,980263,980266,981649,988500,993231,997374,1004521,1009490,1017083,1027115,1037746,1049261,1061175,1383,6851,4731,4143,7147,4969,7593,10032,10631,11515,11914,2900,12079,11821,12040,12031,11742,11306,11257,10957,10633,10667,2004,8634,8703,8869,8781,9170,9561,9500,9775,10380,11132,896,3445,3118,3171,3250,2572,1745,1757,1182,253,-465,495,2537,2511,2919,3334,3245,3136,2205,1391,2008,1584,111,904,-690,-1792,799,-739,2758,6084,8058,9262,10778,606,3441,1821,1127,4133,2506,5894,8289,9449,11270,12362,-119,-35,-208,-155,-236,-109,-46,-14,0,-8,17,24139,24236,26008,25635,25700,25868,25561,25200,25210,25285,24747,24584,12.262016731,11.929974351,12.096824835,12.019611418,11.660313673,11.157752521,11.013610228,10.612820911,10.18971187,10.108811639,8.7648193106,8.7832304183,8.910858759,8.7726878782,9.1062064706,9.4356334561,9.2945986641,9.4679496586,9.9472594007,10.549478875,3.4971974201,3.1467439325,3.1859660756,3.2469235399,2.554107202,1.722119065,1.7190115635,1.1448712528,0.242452469,-0.440667237,2.5754397256,2.5341481765,2.9327767186,3.3308440253,3.2224252996,3.0948798785,2.1573252689,1.3473061867,1.9242867896,1.5011116186,0.9176970879,-0.696360909,-1.80045765,0.7982436641,-0.733858951,2.7218363217,5.9524566603,7.8048837186,8.8758686483,10.214003173,3.4931368135,1.8377872678,1.1323190688,4.1290876894,2.4885663484,5.8167162002,8.1097819291,9.1521899053,10.800155438,11.715114791 +050,4,8,04,021,Arizona,Pinal County,375770,375766,379106,378114,382371,385574,395563,405922,417312,431490,446524,461640,480828,3340,-992,4257,3203,9989,10359,11390,14178,15034,15116,19188,1172,4911,4534,4647,4551,4509,4470,4440,4431,4603,4678,637,2365,2473,2515,2604,2779,2977,3134,3146,3402,3777,535,2546,2061,2132,1947,1730,1493,1306,1285,1201,901,131,1193,1125,1295,1407,1156,883,558,332,506,405,2419,-4760,1118,-172,6462,7389,8985,12234,13372,13448,17977,2550,-3567,2243,1123,7869,8545,9868,12792,13704,13954,18382,255,29,-47,-52,173,84,29,80,45,-39,-95,26245,27300,26922,27116,25227,25411,25712,24413,25473,25892,24692,23582,12.971131243,11.923969572,12.10242921,11.652245381,11.251614191,10.859609783,10.461803813,10.093233138,10.13693562,9.9271274993,6.2465333721,6.5037443211,6.5499482385,6.6672043444,6.9346275975,7.2324515265,7.3845254842,7.166172749,7.4920388828,8.015126243,6.7245978712,5.420225251,5.5524809719,4.9850410363,4.3169865936,3.6271582563,3.0772783288,2.9270603886,2.6448967367,1.9120012563,3.1509997095,2.9586382374,3.3726373634,3.6024410571,2.884645377,2.1451980846,1.314794263,0.7562521782,1.1143361772,0.8594456257,-12.57230395,2.9402289329,-0.447948746,16.545113085,18.438273954,21.828544496,28.826510776,30.459650985,29.615796266,38.148775343,-9.421304244,5.8988671703,2.924688617,20.147554142,21.322919331,23.973742581,30.141305039,31.215903163,30.730132443,39.008220969 +050,4,8,04,023,Arizona,Santa Cruz County,47420,47417,47402,47640,47330,46902,46596,46493,46412,46578,46446,46728,46808,-15,238,-310,-428,-306,-103,-81,166,-132,282,80,180,711,662,670,619,621,651,635,633,597,612,40,277,279,293,285,282,304,305,290,310,371,140,434,383,377,334,339,347,330,343,287,241,-17,68,-2,32,126,269,125,98,71,182,129,-145,-265,-708,-855,-788,-718,-555,-263,-547,-187,-292,-162,-197,-710,-823,-662,-449,-430,-165,-476,-5,-163,7,1,17,18,22,7,2,1,1,0,2,384,365,359,484,467,376,403,387,401,438,472,293,14.961806359,13.941244604,14.22022243,13.24092494,13.342070492,14.014315699,13.657382514,13.609391125,12.814733724,13.085870681,5.8290019149,5.8755396441,6.2186942864,6.0963870885,6.0587180011,6.5443194661,6.5598451446,6.2349501204,6.6542168416,7.9327745467,9.1328044444,8.0657049595,8.0015281433,7.1445378511,7.2833524906,7.4699962327,7.0975373696,7.3744410045,6.1605168824,5.1530961341,1.4309463185,-0.042118564,0.6791748026,2.6952448181,5.7794153982,2.6909208331,2.1077535219,1.5264877881,3.9066692425,2.758296271,-5.576481976,-14.90997157,-18.14670176,-16.85597553,-15.42609761,-11.9476885,-5.656522207,-11.76040592,-4.013995321,-6.243585358,-4.145535658,-14.95209013,-17.46752695,-14.16073071,-9.646682207,-9.256767666,-3.548768685,-10.23391813,-0.107326078,-3.485289087 +050,4,8,04,025,Arizona,Yavapai County,211033,211008,210990,211081,212065,214539,217882,221019,224828,228398,232467,236062,240226,-18,91,984,2474,3343,3137,3809,3570,4069,3595,4164,460,1844,1732,1859,1876,1970,1857,1848,1783,1802,1798,643,2611,2601,2726,2833,2857,2950,3075,3218,3119,3298,-183,-767,-869,-867,-957,-887,-1093,-1227,-1435,-1317,-1500,54,231,110,87,77,59,113,50,-5,38,22,138,635,1721,3187,4100,3921,4769,4726,5500,4893,5671,192,866,1831,3274,4177,3980,4882,4776,5495,4931,5693,-27,-8,22,67,123,44,20,21,9,-19,-29,3525,3525,3591,3609,3657,3718,3770,4120,4154,4181,4089,3976,8.7378663779,8.1862997641,8.7153425659,8.676729391,8.976967471,8.3302119337,8.1548719623,7.7376238161,7.6921599303,7.550053749,12.372325983,12.293629149,12.780002063,13.10297141,13.018881251,13.233239205,13.569389223,13.965043993,13.314010445,13.848763773,-3.634459605,-4.107329385,-4.064659497,-4.426242019,-4.04191378,-4.903027272,-5.414517261,-6.227420177,-5.621850515,-6.298710024,1.0946025669,0.519915112,0.4078724063,0.3561344153,0.2688533405,0.5069003492,0.2206404752,-0.021698328,0.1622098099,0.0923810804,3.0089724241,8.1343082529,14.941256997,18.963001334,17.867355053,21.392989075,20.854937713,23.868160958,20.886647358,23.813323031,4.1035749909,8.654223365,15.349129403,19.31913575,18.136208393,21.899889424,21.075578188,23.84646263,21.048857168,23.905704112 +050,4,8,04,027,Arizona,Yuma County,195751,195750,197148,202881,202520,202447,204064,205187,207162,209244,211245,214182,217824,1398,5733,-361,-73,1617,1123,1975,2082,2001,2937,3642,712,3253,3238,3074,3166,3026,3007,3006,2916,3104,3008,268,1340,1435,1353,1383,1422,1511,1457,1594,1659,1880,444,1913,1803,1721,1783,1604,1496,1549,1322,1445,1128,45,500,667,854,1124,1518,932,581,314,720,585,828,3295,-2925,-2707,-1297,-2003,-441,-40,374,777,1920,873,3795,-2258,-1853,-173,-485,491,541,688,1497,2505,81,25,94,59,7,4,-12,-8,-9,-5,9,5921,6575,10072,9194,8275,8491,9100,9568,9266,9308,9454,9391,16.263820873,15.974306921,15.181483923,15.576454266,14.787990744,14.584732836,14.437832308,13.869566148,14.592397756,13.925732513,6.6995142852,7.0794102629,6.6820259429,6.8042439196,6.9492805149,7.3287433703,6.997977935,7.5816489849,7.7992228984,8.7035828206,9.5643065878,8.8948966579,8.4994579805,8.7722103461,7.8387102292,7.2559894652,7.4398543729,6.2879171631,6.7931748573,5.2221496924,2.4998187631,3.2905690909,4.2176276092,5.5299856584,7.4184302543,4.5204426348,2.7905457654,1.4934992354,3.384834531,2.7082957181,16.473805649,-14.43015681,-13.36899056,-6.381131138,-9.788613834,-2.138964809,-0.19212019,1.7788812549,3.652800598,8.8887654338,18.973624412,-11.13958772,-9.151362951,-0.851145479,-2.370183579,2.3814778258,2.598425575,3.2723804903,7.0376351289,11.597061152 +040,3,7,05,000,Arkansas,Arkansas,2915918,2916029,2921998,2941038,2952876,2960459,2968759,2979732,2991815,3003855,3012161,3020985,3030522,5969,19040,11838,7583,8300,10973,12083,12040,8306,8824,9537,9446,38430,38609,37986,38239,38794,38611,37694,37587,36604,36332,7024,29439,29715,30972,29970,31320,31140,32328,32797,31465,33832,2422,8991,8894,7014,8269,7474,7471,5366,4790,5139,2500,880,4010,4017,2627,3424,3620,3700,2503,1052,1668,1517,2460,5983,-1305,-2144,-3401,-94,943,4170,2449,2028,5550,3340,9993,2712,483,23,3526,4643,6673,3501,3696,7067,207,56,232,86,8,-27,-31,1,15,-11,-30,78973,80154,81463,81271,81678,83099,84631,84797,84279,84062,83283,82365,13.109249201,13.101310945,12.847572478,12.898496901,13.043307958,12.931657408,12.573740716,12.495644958,12.134299419,12.007587532,10.042237503,10.083282518,10.475307081,10.109258928,10.530401744,10.429458229,10.783782296,10.903228981,10.430710611,11.18134706,3.0670116984,3.0180284273,2.3722653968,2.7892379737,2.5129062144,2.5021991789,1.78995842,1.5924159776,1.7035888076,0.826240472,1.3678919932,1.3631009886,0.8885003133,1.1549583773,1.2171153995,1.2392098731,0.8349358787,0.3497331124,0.5529453456,0.5013627184,2.0409221434,-0.442829671,-0.72514072,-1.147200187,-0.031604654,0.3158310568,1.3910038411,0.8141600687,0.6722860677,1.8342538478,3.4088141366,0.9202713172,0.1633595932,0.00775819,1.1855107455,1.5550409299,2.2259397198,1.1638931811,1.2252314133,2.3356165663 +050,3,7,05,001,Arkansas,Arkansas County,19019,19045,19049,18915,19007,18797,18524,18376,18204,17925,17779,17515,17383,4,-134,92,-210,-273,-148,-172,-279,-146,-264,-132,72,234,284,242,220,249,247,238,221,219,208,33,257,254,248,215,243,234,250,232,239,236,39,-23,30,-6,5,6,13,-12,-11,-20,-28,5,25,20,9,-1,-2,3,4,5,4,4,-39,-138,45,-214,-284,-151,-189,-272,-139,-248,-109,-34,-113,65,-205,-285,-153,-186,-268,-134,-244,-105,-1,2,-3,1,7,-1,1,1,-1,0,1,247,247,247,247,247,247,247,247,247,247,247,247,12.327468128,14.978112969,12.802878002,11.789609067,13.495934959,13.504647348,13.175011763,12.379565315,12.410041367,11.920453894,13.539142345,13.395917937,13.12030473,11.521663407,13.170731707,12.793876435,13.839298071,12.995742774,13.543378478,13.52513038,-1.211674218,1.5821950319,-0.317426727,0.2679456606,0.325203252,0.7107709131,-0.664286307,-0.616177459,-1.133337111,-1.604676486,1.3170371931,1.0547966879,0.476140091,-0.053589132,-0.108401084,0.1640240569,0.2214287691,0.2800806632,0.2266674222,0.229239498,-7.270045306,2.3732925479,-11.32155327,-15.21931352,-8.184281843,-10.33351558,-15.0571563,-7.786242438,-14.05338018,-6.24677632,-5.953008113,3.4280892358,-10.84541318,-15.27290266,-8.292682927,-10.16949153,-14.83572753,-7.506161775,-13.82671276,-6.017536822 +050,3,7,05,003,Arkansas,Ashley County,21853,21845,21832,21678,21523,21289,20974,20856,20544,20333,20041,19742,19339,-13,-154,-155,-234,-315,-118,-312,-211,-292,-299,-403,60,303,265,269,264,254,235,234,224,236,222,47,271,210,258,261,269,252,266,284,237,271,13,32,55,11,3,-15,-17,-32,-60,-1,-49,1,2,-5,-5,-2,-5,-3,-4,-5,-4,-3,-26,-188,-207,-242,-324,-97,-294,-174,-227,-294,-347,-25,-186,-212,-247,-326,-102,-297,-178,-232,-298,-350,-1,0,2,2,8,-1,2,-1,0,0,-4,191,191,191,191,191,191,191,191,191,191,191,191,13.927832682,12.268234532,12.566570121,12.493197359,12.144393976,11.352657005,11.44898109,11.096250062,11.864364176,11.361019421,12.456906458,9.721997176,12.052695506,12.351229208,12.861582596,12.173913043,13.014653717,14.0684599,11.914636905,13.868631816,1.4709262239,2.5462373556,0.5138746146,0.1419681518,-0.717188621,-0.821256039,-1.565672628,-2.972209838,-0.05027273,-2.507612395,0.091932889,-0.231476123,-0.23357937,-0.094645435,-0.239062874,-0.144927536,-0.195709078,-0.247684153,-0.201090918,-0.153527289,-8.641691565,-9.583111502,-11.30524152,-15.3325604,-4.637819747,-14.20289855,-8.513344913,-11.24486055,-14.78018249,-17.75798982,-8.549758676,-9.814587625,-11.53882089,-15.42720583,-4.87688262,-14.34782609,-8.709053991,-11.49254471,-14.98127341,-17.91151711 +050,3,7,05,005,Arkansas,Baxter County,41513,41511,41511,41354,41091,41000,40903,41156,41159,41319,41665,41978,42242,0,-157,-263,-91,-97,253,3,160,346,313,264,82,331,325,343,326,384,378,361,366,344,350,135,681,673,664,663,636,714,695,681,689,753,-53,-350,-348,-321,-337,-252,-336,-334,-315,-345,-403,0,2,-10,1,20,19,18,-4,-5,-5,-5,56,193,100,232,220,484,322,499,667,667,677,56,195,90,233,240,503,340,495,662,662,672,-3,-2,-5,-3,0,2,-1,-1,-1,-4,-5,595,595,595,595,595,595,595,595,595,595,595,595,7.9888976045,7.8840439081,8.356579893,7.9606363625,9.3591196578,9.1842313066,8.7538495114,8.8209775378,8.2254342862,8.3115649489,16.436372413,16.326035539,16.177169239,16.189883154,15.501041933,17.347992468,16.852978976,16.412802468,16.474779719,17.881738304,-8.447474808,-8.441991631,-7.820589346,-8.229246792,-6.141922275,-8.163761161,-8.099129465,-7.59182493,-8.249345432,-9.570173355,0.0482712846,-0.242585966,0.0243632067,0.4883825989,0.4630814414,0.4373443479,-0.096995562,-0.120505158,-0.119555731,-0.118736642,4.6581789658,2.425859664,5.652263951,5.3722085882,11.796390402,7.8236044463,12.100196416,16.075388027,15.948734503,16.076941344,4.7064502504,2.1832736976,5.6766271577,5.8605911871,12.259471843,8.2609487943,12.003200854,15.954882869,15.829178772,15.958204702 +050,3,7,05,007,Arkansas,Benton County,221339,221348,222601,229208,235010,239559,244962,251759,259497,266882,272560,279835,288774,1253,6607,5802,4549,5403,6797,7738,7385,5678,7275,8939,829,3279,3364,3234,3434,3563,3711,3663,3757,3801,3875,292,1588,1661,1660,1621,1855,1773,1748,1979,1865,1998,537,1691,1703,1574,1813,1708,1938,1915,1778,1936,1877,156,841,970,566,809,715,874,606,287,370,330,528,4048,3051,2368,2738,4321,4904,4841,3600,4973,6765,684,4889,4021,2934,3547,5036,5778,5447,3887,5343,7095,32,27,78,41,43,53,22,23,13,-4,-33,2061,2061,2139,2132,2110,2109,2137,2150,2146,2079,2034,2034,14.514983101,14.493190699,13.629208819,14.174824208,14.346081603,14.51718904,13.917728481,13.92920833,13.7618914,13.629752607,7.029519111,7.1561206157,6.9958214717,6.6911444499,7.4689815812,6.9358599214,6.6416023436,7.3372114148,6.752414486,7.0276763118,7.4854639903,7.3370700835,6.6333873473,7.4836797579,6.8771000219,7.5813291189,7.2761261373,6.5919969153,7.0094769142,6.602076295,3.7228120732,4.1790710399,2.3853222608,3.3393805428,2.878879693,3.4190307791,2.3025234669,1.0640624942,1.3396211045,1.1607273188,17.919076424,13.144686333,9.9795814729,11.301883716,17.398096718,19.184126934,18.39359093,13.347125363,18.005231764,23.794910035,21.641888497,17.323757373,12.364903734,14.641264259,20.276976411,22.603157714,20.696114397,14.411187857,19.344852868,24.955637354 +050,3,7,05,009,Arkansas,Boone County,36903,36918,36893,37093,37348,37353,37150,37165,37307,37531,37545,37616,37625,-25,200,255,5,-203,15,142,224,14,71,9,93,419,476,485,459,441,462,482,388,391,372,128,411,397,458,400,447,476,463,434,464,493,-35,8,79,27,59,-6,-14,19,-46,-73,-121,-1,0,3,-9,4,2,10,0,-6,-7,-4,16,191,179,-8,-266,24,150,205,69,152,134,15,191,182,-17,-262,26,160,205,63,145,130,-5,1,-6,-5,0,-5,-4,0,-3,-1,0,465,465,465,465,465,465,465,465,465,465,465,465,11.326467169,12.788651415,12.985100601,12.321651477,11.868398035,12.407347728,12.881156632,10.336192658,10.404332034,9.8882258343,11.11021004,10.666165151,12.262218712,10.737822638,12.029872839,12.783327962,12.373393196,11.561617561,12.346828807,13.104557356,0.2162571297,2.1224862643,0.7228818891,1.5838288391,-0.161474803,-0.375980234,0.5077634357,-1.225424903,-1.942496774,-3.216331521,0,0.0806007442,-0.24096063,0.1073782264,0.0538249344,0.2685573101,0,-0.159838031,-0.186266814,-0.106325009,5.1631389722,4.8091777381,-0.214187226,-7.140652054,0.6458992128,4.0283596519,5.4785002272,1.8381373541,4.0446508162,3.5618878005,5.1631389722,4.8897784823,-0.455147856,-7.033273828,0.6997241472,4.2969169621,5.4785002272,1.6782993234,3.8583840023,3.4555627916 +050,3,7,05,011,Arkansas,Bradley County,11508,11505,11470,11432,11262,11120,11006,10999,10961,10813,10818,10792,10639,-35,-38,-170,-142,-114,-7,-38,-148,5,-26,-153,35,147,129,151,121,139,138,125,141,141,136,62,152,147,157,167,142,139,157,167,118,131,-27,-5,-18,-6,-46,-3,-1,-32,-26,23,5,8,0,-4,1,-5,-1,-2,-1,-4,-4,-1,-15,-33,-152,-138,-64,-2,-33,-118,35,-44,-157,-7,-33,-156,-137,-69,-3,-35,-119,31,-48,-158,-1,0,4,1,1,-1,-2,3,0,-1,0,220,220,268,235,223,225,223,226,229,229,225,224,12.837306785,11.368643694,13.492985435,10.937358763,12.633492388,12.568306011,11.48158354,13.036845268,13.049514114,12.691894919,13.273949873,12.95496607,14.029130551,15.095362921,12.906157691,12.659380692,14.420868926,15.440802552,10.920869968,12.225281135,-0.436643088,-1.586322376,-0.536145117,-4.158004158,-0.272665303,-0.091074681,-2.939285386,-2.403957284,2.1286441462,0.4666137838,0,-0.352516084,0.0893575194,-0.451956974,-0.090888434,-0.182149362,-0.091852668,-0.369839582,-0.370198982,-0.093322757,-2.88184438,-13.39561117,-12.33133768,-5.785049263,-0.181776869,-3.005464481,-10.83861486,3.2360963432,-4.072188801,-14.65167281,-2.88184438,-13.74812726,-12.24198016,-6.237006237,-0.272665303,-3.187613843,-10.93046753,2.8662567611,-4.442387783,-14.74499557 +050,3,7,05,013,Arkansas,Calhoun County,5368,5368,5361,5241,5276,5190,5165,5197,5147,5196,5206,5137,5113,-7,-120,35,-86,-25,32,-50,49,10,-69,-24,14,39,48,50,46,42,56,41,36,31,29,4,57,50,70,65,57,71,80,76,55,53,10,-18,-2,-20,-19,-15,-15,-39,-40,-24,-24,0,0,0,0,0,0,0,0,0,-1,0,-16,-103,37,-66,-4,46,-35,88,51,-44,-1,-16,-103,37,-66,-4,46,-35,88,51,-45,-1,-1,1,0,0,-2,1,0,0,-1,0,1,175,175,175,175,175,175,175,175,175,175,175,175,7.3571024335,9.1280783493,9.5547487101,8.8845968131,8.1065431384,10.827532869,7.9280672919,6.9217458181,5.9943923426,5.6585365854,10.752688172,9.5084149472,13.376648194,12.554321584,11.001737116,13.727764888,15.469399594,14.612574505,10.635212221,10.341463415,-3.395585739,-0.380336598,-3.821899484,-3.669724771,-2.895193978,-2.900232019,-7.541332302,-7.690828687,-4.640819878,-4.682926829,0,0,0,0,0,0,0,0,-0.193367495,0,-19.43029617,7.0362270609,-12.6122683,-0.772573636,8.8785948659,-6.767208043,17.016339553,9.8058065757,-8.508169777,-0.195121951,-19.43029617,7.0362270609,-12.6122683,-0.772573636,8.8785948659,-6.767208043,17.016339553,9.8058065757,-8.701537272,-0.195121951 +050,3,7,05,015,Arkansas,Carroll County,27446,27451,27556,27478,27643,27815,27763,27777,27730,27901,28049,28352,28276,105,-78,165,172,-52,14,-47,171,148,303,-76,74,313,305,309,311,338,310,331,308,316,322,38,303,305,298,308,335,308,342,332,306,331,36,10,0,11,3,3,2,-11,-24,10,-9,7,18,29,38,55,36,65,54,34,39,32,60,-105,136,123,-103,-21,-113,130,137,255,-98,67,-87,165,161,-48,15,-48,184,171,294,-66,2,-1,0,0,-7,-4,-1,-2,1,-1,-1,230,230,230,230,230,230,230,230,230,230,230,230,11.374786496,11.066562653,11.143568106,11.191478643,12.171407994,11.169762372,11.899840017,11.009830206,11.20547508,11.372465918,11.011374786,11.066562653,10.746871506,11.083522257,12.063377746,11.097699389,12.295302979,11.867739053,10.850871438,11.690329872,0.3634117091,0,0.3966965992,0.1079563856,0.1080302485,0.072062983,-0.395462961,-0.857908847,0.3546036418,-0.317863954,0.6541410764,1.0522305473,1.3704064337,1.979200403,1.2963629816,2.342046949,1.9413636282,1.2153708668,1.3829542029,1.1301829484,-3.815822946,4.9345984289,4.4357892459,-3.706502573,-0.756211739,-4.071558542,4.673653179,4.8972296693,9.0423928654,-3.461185279,-3.161681869,5.9868289763,5.8061956796,-1.72730217,0.5401512423,-1.729511593,6.6150168072,6.1126005362,10.425347068,-2.331002331 +050,3,7,05,017,Arkansas,Chicot County,11800,11800,11799,11706,11503,11370,11223,10987,10929,10655,10466,10189,9924,-1,-93,-203,-133,-147,-236,-58,-274,-189,-277,-265,34,169,169,129,142,105,151,127,112,125,114,20,181,160,153,148,159,151,139,156,138,161,14,-12,9,-24,-6,-54,0,-12,-44,-13,-47,2,19,19,12,19,9,-1,-1,-1,-1,0,-17,-100,-238,-122,-162,-192,-56,-260,-144,-261,-216,-15,-81,-219,-110,-143,-183,-57,-261,-145,-262,-216,0,0,7,1,2,1,-1,-1,0,-2,-2,722,722,722,722,722,728,732,770,764,769,761,734,14.379919166,14.563315955,11.279674726,12.570265126,9.4552003602,13.779886841,11.767976279,10.605558449,12.103606875,11.335951872,15.400978515,13.78775475,13.378218861,13.101403089,14.317874831,13.779886841,12.879911045,14.77202784,13.36238199,16.009546065,-1.021059349,0.7755612047,-2.098544135,-0.531137963,-4.862674471,0,-1.111934766,-4.166469391,-1.258775115,-4.673594193,1.6166773027,1.6372958766,1.0492720675,1.6819368831,0.8104457452,-0.091257529,-0.092661231,-0.094692486,-0.096828855,0,-8.508827909,-20.50928519,-10.66759935,-14.340725,-17.28950923,-5.11042161,-24.09191994,-13.63571801,-25.27233115,-21.47864565,-6.892150606,-18.87198931,-9.618327285,-12.65878812,-16.47906348,-5.201679139,-24.18458117,-13.73041049,-25.36916001,-21.47864565 +050,3,7,05,019,Arkansas,Clark County,22995,22992,22928,22937,22768,22600,22578,22536,22643,22234,22358,22365,22103,-64,9,-169,-168,-22,-42,107,-409,124,7,-262,65,238,250,221,243,250,233,229,247,218,218,93,269,247,249,232,270,208,269,244,231,259,-28,-31,3,-28,11,-20,25,-40,3,-13,-41,8,23,13,18,15,17,32,23,9,27,18,-47,18,-190,-160,-42,-37,50,-396,111,-8,-237,-39,41,-177,-142,-27,-20,82,-373,120,19,-219,3,-1,5,2,-6,-2,0,4,1,1,-2,2612,2612,2766,2653,2632,2753,2817,2908,2755,2986,2976,2976,10.378284095,10.939722131,9.7425498148,10.757448316,11.083034091,10.314526661,10.205673285,11.078220309,9.7488987769,9.8048034542,11.730077401,10.808445465,10.976900018,10.270485635,11.969676819,9.2078177915,11.98832364,10.943667025,10.330255126,11.648826122,-1.351793306,0.1312766656,-1.234350203,0.486962681,-0.886642727,1.1067088692,-1.782650355,0.1345532831,-0.581356349,-1.844022668,1.0029434209,0.5688655508,0.7935108446,0.6640400195,0.7536463182,1.4165873525,1.0250239544,0.4036598493,1.2074324173,0.8095709274,0.7849122425,-8.31418882,-7.05342973,-1.859312055,-1.640289046,2.2134177383,-17.64823852,4.9784714747,-0.357757753,-10.65935054,1.7878556634,-7.745323269,-6.259918886,-1.195272035,-0.886642727,3.6300050909,-16.62321456,5.382131324,0.849674664,-9.849779617 +050,3,7,05,021,Arkansas,Clay County,16083,16083,16050,15876,15710,15482,15298,15206,15059,14859,14763,14494,14375,-33,-174,-166,-228,-184,-92,-147,-200,-96,-269,-119,37,176,165,145,175,180,181,157,185,142,153,84,236,256,241,254,212,242,257,256,206,208,-47,-60,-91,-96,-79,-32,-61,-100,-71,-64,-55,0,0,-1,-2,-1,0,-1,0,0,0,0,16,-115,-74,-129,-105,-60,-83,-100,-24,-204,-64,16,-115,-75,-131,-106,-60,-84,-100,-24,-204,-64,-2,1,0,-1,1,0,-2,0,-1,-1,0,125,125,125,125,125,125,125,125,125,125,125,125,11.025496461,10.447666688,9.2972557066,11.371020143,11.801730921,11.961011069,10.495353968,12.490716359,9.7070786478,10.599605113,14.784188436,16.209713164,15.452680174,16.504223522,13.899816418,15.992070048,17.1802928,17.284450746,14.08210001,14.409920676,-3.758691975,-5.762046476,-6.155424468,-5.133203379,-2.098085497,-4.031058979,-6.684938833,-4.793734387,-4.375021362,-3.810315563,0,-0.063319192,-0.12823801,-0.064977258,0,-0.066082934,0,0,0,0,-7.204159619,-4.685620211,-8.271351629,-6.822612086,-3.933910307,-5.484883529,-6.684938833,-1.620417257,-13.94538059,-4.433821747,-7.204159619,-4.748939404,-8.399589638,-6.887589344,-3.933910307,-5.550966463,-6.684938833,-1.620417257,-13.94538059,-4.433821747 +050,3,7,05,023,Arkansas,Cleburne County,25970,25967,25989,25888,25776,25645,25616,25384,25171,25085,25105,25019,24935,22,-101,-112,-131,-29,-232,-213,-86,20,-86,-84,71,267,231,264,211,261,205,256,238,211,215,104,361,358,367,356,364,382,383,364,397,413,-33,-94,-127,-103,-145,-103,-177,-127,-126,-186,-198,-1,-5,-2,-5,-2,5,-2,-4,-4,-4,-2,55,0,20,-17,123,-132,-32,47,153,106,117,54,-5,18,-22,121,-127,-34,43,149,102,115,1,-2,-3,-6,-5,-2,-2,-2,-3,-2,-1,339,339,339,339,339,339,339,339,339,339,339,339,10.293579043,8.9423970269,10.268178371,8.2323793917,10.235294118,8.1099792305,10.187838268,9.4839609484,8.419120581,8.6079192857,13.917535709,13.858779808,14.27432372,13.889701723,14.274509804,15.112253981,15.241961159,14.50488145,15.840715027,16.535212395,-3.623956667,-4.916382781,-4.006145349,-5.657322331,-4.039215686,-7.00227475,-5.054122891,-5.020920502,-7.421594446,-7.92729311,-0.192763652,-0.077423351,-0.194473075,-0.078032032,0.1960784314,-0.079121749,-0.159184973,-0.159394302,-0.159604182,-0.080073668,0,0.7742335088,-0.661208456,4.7989699772,-5.176470588,-1.265947977,1.870423432,6.0968320383,4.2295108132,4.6843095648,-0.192763652,0.6968101579,-0.855681531,4.720937945,-4.980392157,-1.345069726,1.7112384591,5.9374377366,4.0699066316,4.604235897 +050,3,7,05,025,Arkansas,Cleveland County,8689,8692,8677,8673,8610,8517,8404,8290,8253,8177,7991,7937,7957,-15,-4,-63,-93,-113,-114,-37,-76,-186,-54,20,21,85,100,87,78,88,76,90,86,58,65,42,91,84,108,86,105,119,118,99,84,94,-21,-6,16,-21,-8,-17,-43,-28,-13,-26,-29,0,1,0,0,2,1,2,0,-1,-1,0,7,0,-80,-74,-108,-97,4,-48,-173,-26,50,7,1,-80,-74,-106,-96,6,-48,-174,-27,50,-1,1,1,2,1,-1,0,0,1,-1,-1,52,52,52,52,52,52,52,52,52,52,52,52,9.7982708934,11.572065035,10.159397443,9.2193132794,10.542709956,9.1881762679,10.955569081,10.638297872,7.2827724761,8.1791871146,10.489913545,9.7205346294,12.611665791,10.164883872,12.579369833,14.386749683,14.363968351,12.246412667,10.547463586,11.828362904,-0.691642651,1.8515304056,-2.452268348,-0.945570593,-2.036659878,-5.198573415,-3.40839927,-1.608114795,-3.26469111,-3.64917579,0.1152737752,0,0,0.2363926482,0.1198035222,0.2417941123,0,-0.123701138,-0.125565043,0,0,-9.257652028,-8.64132656,-12.765203,-11.62094166,0.4835882246,-5.842970177,-21.40029688,-3.26469111,6.2916823959,0.1152737752,-9.257652028,-8.64132656,-12.52881035,-11.50113813,0.7253823369,-5.842970177,-21.52399802,-3.390256153,6.2916823959 +050,3,7,05,027,Arkansas,Columbia County,24552,24552,24722,24707,24408,24282,24051,24118,24015,23675,23582,23496,23331,170,-15,-299,-126,-231,67,-103,-340,-93,-86,-165,72,288,300,285,307,315,292,267,294,280,281,118,313,317,315,284,278,293,311,307,281,300,-46,-25,-17,-30,23,37,-1,-44,-13,-1,-19,11,43,51,34,40,27,10,6,5,5,3,179,-33,-340,-128,-297,7,-110,-303,-84,-92,-148,190,10,-289,-94,-257,34,-100,-297,-79,-87,-145,26,0,7,-2,3,-4,-2,1,-1,2,-1,1315,1567,1640,1580,1653,1746,1817,1974,2061,2161,2204,2204,11.653078153,12.216227222,11.706715958,12.703535886,13.078951193,12.133048013,11.197315999,12.442601096,11.895152725,12.001622995,12.664630075,12.908480098,12.939001848,11.751805185,11.542693434,12.174599547,13.042566576,12.992784138,11.937635414,12.813120636,-1.011551923,-0.692252876,-1.23228589,0.9517307016,1.5362577591,-0.041551534,-1.845250577,-0.550183042,-0.042482688,-0.81149764,1.7398693075,2.0767586277,1.3965906757,1.6551838289,1.1210529594,0.4155153429,0.2516250786,0.2116088622,0.2124134415,0.1281312064,-1.335248538,-13.84505752,-5.257753132,-12.28973993,0.2906433598,-4.570668772,-12.70706647,-3.555028885,-3.908407324,-6.321139514,0.4046207692,-11.76829889,-3.861162456,-10.6345561,1.4116963192,-4.155153429,-12.45544139,-3.343420022,-3.695993882,-6.193008307 +050,3,7,05,029,Arkansas,Conway County,21273,21267,21219,21127,21141,21091,20999,20939,20877,20821,20836,20905,21037,-48,-92,14,-50,-92,-60,-62,-56,15,69,132,57,271,268,270,254,252,231,238,235,241,239,76,254,254,257,265,262,260,296,288,218,238,-19,17,14,13,-11,-10,-29,-58,-53,23,1,1,10,2,2,1,3,1,9,3,14,15,-28,-118,3,-63,-79,-49,-35,-5,66,32,116,-27,-108,5,-61,-78,-46,-34,4,69,46,131,-2,-1,-5,-2,-3,-4,1,-2,-1,0,0,286,286,286,286,286,286,286,286,286,286,286,286,12.799319889,12.680987981,12.786512597,12.069375148,12.017740474,11.048402525,11.415415607,11.282617567,11.547399439,11.396690668,11.996410523,12.018548311,12.170865694,12.592064623,12.494634937,12.435431414,14.197323613,13.827207912,10.445365468,11.34900577,0.8029093657,0.6624396707,0.6156469028,-0.522689475,-0.476894463,-1.387028888,-2.781908005,-2.544590345,1.1020339714,0.0476848982,0.4722996269,0.0946342387,0.0947149081,0.047517225,0.143068339,0.0478285824,0.4316753801,0.1440334158,0.6708032869,0.7152734729,-5.573135597,0.141951358,-2.983519606,-3.753860775,-2.33678287,-1.674000383,-0.239819656,3.1687351466,1.5332646559,5.5314481904,-5.10083597,0.2365855967,-2.888804698,-3.70634355,-2.193714531,-1.6261718,0.1918557245,3.3127685623,2.2040679428,6.2467216632 +050,3,7,05,031,Arkansas,Craighead County,96443,96443,96751,98420,100018,101682,102707,104509,106039,107274,109074,110772,112245,308,1669,1598,1664,1025,1802,1530,1235,1800,1698,1473,334,1365,1406,1423,1428,1558,1579,1440,1545,1519,1544,171,860,886,848,920,912,896,969,902,1030,1123,163,505,520,575,508,646,683,471,643,489,421,29,162,173,119,168,179,220,144,66,95,80,117,997,887,957,362,974,629,623,1090,1115,969,146,1159,1060,1076,530,1153,849,767,1156,1210,1049,-1,5,18,13,-13,3,-2,-3,1,-1,3,3579,3579,3618,3669,3792,3845,3811,3722,3758,3834,3943,3943,13.987733833,14.170672956,14.110064452,13.97335473,15.037448846,14.998955108,13.501286841,14.282544789,13.818764044,13.846478071,8.8127846862,8.9297412794,8.4085275161,9.002441423,8.8024090804,8.5111233543,9.085240937,8.3384177344,9.3701955005,10.070981136,5.1749491472,5.2409316764,5.701536936,4.9709133075,6.2350397653,6.4878317533,4.4160459044,5.9441270546,4.4485685434,3.7754969352,1.6600826967,1.7436176539,1.1799702529,1.6439240859,1.7276658173,2.0897847522,1.3501286841,0.6101281269,0.8642413326,0.717434097,10.216681782,8.9398199942,9.4893406049,3.5422649947,9.4008184696,5.9748845869,5.8411817376,10.07635846,10.143464061,8.6899204993,11.876764478,10.683437648,10.669310858,5.1861890806,11.128484287,8.0646693391,7.1913104218,10.686486586,11.007705394,9.4073545963 +050,3,7,05,033,Arkansas,Crawford County,61948,61935,61961,61816,61940,61708,61856,61963,62312,62982,63480,63406,63409,26,-145,124,-232,148,107,349,670,498,-74,3,183,710,774,768,819,807,755,761,756,761,714,163,574,584,617,586,667,620,637,672,636,719,20,136,190,151,233,140,135,124,84,125,-5,4,-9,37,54,76,92,51,36,25,13,18,6,-271,-92,-439,-154,-120,166,513,393,-213,-12,10,-280,-55,-385,-78,-28,217,549,418,-200,6,-4,-1,-11,2,-7,-5,-3,-3,-4,1,2,540,540,540,540,540,540,540,540,540,540,540,540,11.47224444,12.508484437,12.422360248,13.256288239,13.035156155,12.150472742,12.147429246,11.956160744,11.995019151,11.260497575,9.2747440962,9.437926242,9.9799430642,9.4849632579,10.773790775,9.9778716556,10.168084665,10.627698439,10.024746623,11.3393526,2.1975003434,3.0705581952,2.4424171843,3.7713249814,2.2613653801,2.1726010863,1.9793445815,1.3284623049,1.9702725281,-0.078855025,-0.145422817,0.5979508064,0.873447205,1.2301317536,1.4860401069,0.8207604104,0.5746484269,0.395375686,0.2049083429,0.2838780901,-4.378842596,-1.4867966,-7.100802277,-2.492635395,-1.938313183,2.6714946691,8.1887400833,6.2153057836,-3.357344388,-0.18925206,-4.524265413,-0.888845793,-6.227355072,-1.262503642,-0.452273076,3.4922550795,8.7633885102,6.6106814695,-3.152436045,0.09462603 +050,3,7,05,035,Arkansas,Crittenden County,50902,50912,50955,50517,50038,49677,49479,48972,49296,48704,48365,47924,47616,43,-438,-479,-361,-198,-507,324,-592,-339,-441,-308,196,794,789,794,769,829,826,736,739,702,689,89,513,523,526,496,464,479,545,533,541,567,107,281,266,268,273,365,347,191,206,161,122,3,9,9,-5,11,13,25,14,5,7,3,-66,-732,-779,-633,-489,-894,-47,-796,-552,-610,-433,-63,-723,-770,-638,-478,-881,-22,-782,-547,-603,-430,-1,4,25,9,7,9,-1,-1,2,1,0,701,701,701,701,701,701,701,955,1038,1053,1057,1011,15.649637338,15.692904381,15.925387354,15.510912098,16.840864999,16.811169455,15.020408163,15.226282335,14.581104799,14.423278208,10.111163671,10.402267416,10.550067693,10.004437452,9.4260088775,9.7488500834,11.12244898,10.98187887,11.237005265,11.869374084,5.5384736676,5.2906369648,5.375319661,5.506474646,7.4148561213,7.0623193715,3.8979591837,4.2444034656,3.3440995337,2.5539041239,0.1773888363,0.1790065138,-0.100285815,0.2218726048,0.264090766,0.5088126348,0.2857142857,0.1030195016,0.1453956319,0.0628009211,-14.42762535,-15.49400825,-12.69618412,-9.863245795,-18.16131883,-0.956567753,-16.24489796,-11.37335298,-12.67019078,-9.064266276,-14.25023652,-15.31500174,-12.79646994,-9.64137319,-17.89722806,-0.447755119,-15.95918367,-11.27033347,-12.52479515,-9.001465355 +050,3,7,05,037,Arkansas,Cross County,17870,17885,17868,17813,17703,17521,17180,17253,17029,16792,16584,16333,16142,-17,-55,-110,-182,-341,73,-224,-237,-208,-251,-191,48,219,244,234,218,203,229,209,216,201,199,23,217,244,249,211,233,219,265,224,216,225,25,2,0,-15,7,-30,10,-56,-8,-15,-26,0,0,0,0,0,6,8,6,4,4,3,-44,-57,-112,-170,-356,98,-243,-186,-205,-238,-167,-44,-57,-112,-170,-356,104,-235,-180,-201,-234,-164,2,0,2,3,8,-1,1,-1,1,-2,-1,225,225,225,225,225,225,225,225,225,225,225,225,12.275440711,13.740286068,13.286395639,12.56447941,11.791014434,13.359780643,12.359185122,12.943432407,12.212534557,12.255581216,12.163336229,13.740286068,14.138087667,12.161032823,13.533528882,12.776384108,15.670737116,13.422818792,13.123917732,13.856812933,0.1121044814,0,-0.851692028,0.4034465866,-1.742514448,0.5833965346,-3.311551994,-0.479386385,-0.911383176,-1.601231717,0,0,0,0,0.3485028897,0.4667172277,0.3548091422,0.2396931927,0.2430355136,0.1847575058,-3.194977719,-6.307016556,-9.652509653,-20.51814069,5.6922138646,-14.17653579,-10.99908341,-12.28427613,-14.46061306,-10.28483449,-3.194977719,-6.307016556,-9.652509653,-20.51814069,6.0407167543,-13.70981856,-10.64427427,-12.04458293,-14.21757754,-10.10007698 +050,3,7,05,039,Arkansas,Dallas County,8116,8124,8066,8056,7954,7896,7698,7539,7401,7312,7106,6951,6802,-58,-10,-102,-58,-198,-159,-138,-89,-206,-155,-149,26,98,79,78,67,80,71,76,82,58,53,50,101,119,113,107,115,103,129,106,82,87,-24,-3,-40,-35,-40,-35,-32,-53,-24,-24,-34,-1,9,3,5,1,2,-4,-2,-3,-2,-1,-34,-15,-66,-28,-161,-127,-102,-34,-179,-130,-113,-35,-6,-63,-23,-160,-125,-106,-36,-182,-132,-114,1,-1,1,0,2,1,0,0,0,1,-1,405,405,405,405,405,404,403,404,402,401,401,401,12.157300583,9.86883198,9.8422712934,8.5930486084,10.500754742,9.5046854083,10.330999796,11.374670551,8.2521163833,7.7074092925,12.529462846,14.865708932,14.258675079,13.723226882,15.094834941,13.788487282,17.535512812,14.703842419,11.666785232,12.651785065,-0.372162263,-4.996876952,-4.416403785,-5.130178274,-4.5940802,-4.283801874,-7.204513016,-3.329171868,-3.414668848,-4.944375773,1.1164867882,0.3747657714,0.6309148265,0.1282544568,0.2625188685,-0.535475234,-0.271868416,-0.416146484,-0.284555737,-0.145422817,-1.860811314,-8.244846971,-3.533123028,-20.64896755,-16.66994815,-13.65461847,-4.621763067,-24.83007352,-18.49612293,-16.4327783,-0.744324525,-7.870081199,-2.902208202,-20.52071309,-16.40742928,-14.19009371,-4.893631482,-25.24622,-18.78067867,-16.57820112 +050,3,7,05,041,Arkansas,Desha County,13008,13000,12953,12726,12586,12497,12265,12024,11904,11762,11516,11400,11110,-47,-227,-140,-89,-232,-241,-120,-142,-246,-116,-290,43,192,174,154,172,162,160,161,146,140,139,51,149,154,133,153,172,164,159,182,167,178,-8,43,20,21,19,-10,-4,2,-36,-27,-39,1,1,4,25,6,18,12,17,8,22,17,-41,-273,-169,-137,-262,-252,-127,-163,-218,-111,-267,-40,-272,-165,-112,-256,-234,-115,-146,-210,-89,-250,1,2,5,2,5,3,-1,2,0,0,-1,56,56,56,56,56,56,56,56,56,56,56,56,14.953853343,13.748419722,12.279232947,13.892254261,13.339371732,13.373453694,13.606017071,12.544032993,12.218537267,12.350066637,11.604813272,12.168141593,10.60479209,12.357644778,14.16278974,13.707790037,13.436998225,15.637082224,14.574969454,15.815193247,3.3490400717,1.580278129,1.6744408564,1.5346094823,-0.823418008,-0.334336342,0.1690188456,-3.093049231,-2.356432187,-3.46512661,0.0778846528,0.3160556258,1.9933819719,0.4846135207,1.4821524147,1.0030090271,1.4366601876,0.6873442736,1.9200558562,1.5104398045,-21.26251022,-13.35335019,-10.92373321,-21.16145707,-20.75013381,-10.61517887,-13.77503592,-18.73013145,-9.687554547,-23.72278987,-21.18462557,-13.03729456,-8.930351234,-20.67684355,-19.26798139,-9.612169843,-12.33837573,-18.04278718,-7.767498691,-22.21235007 +050,3,7,05,043,Arkansas,Drew County,18509,18517,18666,18735,18789,18684,18643,18615,18574,18372,18302,18092,17977,149,69,54,-105,-41,-28,-41,-202,-70,-210,-115,45,219,242,223,254,239,261,228,236,244,247,65,164,179,176,230,196,236,211,219,186,213,-20,55,63,47,24,43,25,17,17,58,34,3,25,9,12,1,-2,-2,-1,-1,-1,-1,146,-9,-17,-168,-65,-68,-63,-218,-86,-268,-147,149,16,-8,-156,-64,-70,-65,-219,-87,-269,-148,20,-2,-1,4,-1,-1,-1,0,0,1,-1,785,956,983,979,905,998,978,992,905,895,781,781,11.71091682,12.898411683,11.901902703,13.609451603,12.829459445,14.036408615,12.342337465,12.870153242,13.408803649,13.69597161,8.7698189888,9.5405607078,9.3934299362,12.323519168,10.52123034,12.691925032,11.422075461,11.943065932,10.221465077,11.810696166,2.9410978316,3.3578509754,2.5084727671,1.285932435,2.3082291052,1.3444835839,0.920262004,0.9270873098,3.1873385723,1.8852754443,1.3368626507,0.4796929965,0.640461132,0.0535805181,-0.107359493,-0.107558687,-0.054133059,-0.054534548,-0.054954113,-0.055449278,-0.481270554,-0.906086771,-8.966455848,-3.482733678,-3.650222771,-3.388098631,-11.80100687,-4.689971097,-14.72770237,-8.151043833,0.8555920965,-0.426393775,-8.325994716,-3.42915316,-3.757582264,-3.495657318,-11.85513993,-4.744505644,-14.78265648,-8.20649311 +050,3,7,05,045,Arkansas,Faulkner County,113237,113242,114035,116307,118572,119251,120646,121333,122213,123706,125336,125828,126919,793,2272,2265,679,1395,687,880,1493,1630,492,1091,387,1579,1567,1517,1545,1558,1572,1506,1560,1447,1441,237,806,826,900,867,917,976,932,1002,986,1012,150,773,741,617,678,641,596,574,558,461,429,26,113,160,70,126,139,197,157,82,117,104,568,1376,1333,9,596,-78,92,761,986,-90,549,594,1489,1493,79,722,61,289,918,1068,27,653,49,10,31,-17,-5,-15,-5,1,4,4,9,4055,4229,4278,4343,4364,4363,4409,4241,4199,4406,4059,4046,13.710048537,13.343040459,12.757386796,12.880527893,12.877150497,12.909265601,12.247935296,12.528007324,11.522351929,11.402707055,6.9982895,7.0334086913,7.568653999,7.2281020605,7.5791700933,8.0149129938,7.5797315376,8.0468354735,7.8514436782,8.008008008,6.7117590366,6.3096317678,5.1887327971,5.6524258328,5.2979804033,4.8943526069,4.6682037581,4.4811718505,3.6709082512,3.3946990469,0.9811497686,1.3624036206,0.5886730888,1.0504508185,1.148860025,1.6177642006,1.2768431882,0.6585234619,0.9316621809,0.8229573447,11.94745205,11.350525164,0.07568654,4.9687991096,-0.644684043,0.7555040937,6.1890297212,7.9183430907,-0.716663216,4.3442652138,12.928601818,12.712928785,0.6643596288,6.0192499281,0.5041759822,2.3732682943,7.4658729094,8.5768665526,0.2149989648,5.1672225585 +050,3,7,05,047,Arkansas,Franklin County,18125,18131,18137,18006,17958,17917,17828,17753,17676,17833,17780,17737,17897,6,-131,-48,-41,-89,-75,-77,157,-53,-43,160,45,201,205,184,195,219,200,177,190,174,173,35,234,245,216,219,249,240,238,209,205,203,10,-33,-40,-32,-24,-30,-40,-61,-19,-31,-30,1,3,5,5,3,4,11,13,16,2,5,-3,-101,-17,-11,-67,-47,-49,207,-49,-15,187,-2,-98,-12,-6,-64,-43,-38,220,-33,-13,192,-2,0,4,-3,-1,-2,1,-2,-1,1,-2,447,447,446,446,446,447,448,448,447,447,447,447,11.122485682,11.400289178,10.257839721,10.910616869,12.309940699,11.290186006,9.9693035568,10.67026086,9.7981248416,9.7098276927,12.948565421,13.624735847,12.041811847,12.253462023,13.996233945,13.548223207,13.40505224,11.737286946,11.543767773,11.393612842,-1.826079739,-2.224446669,-1.783972125,-1.342845153,-1.686293246,-2.258037201,-3.435748683,-1.067026086,-1.745642932,-1.683785149,0.166007249,0.2780558336,0.2787456446,0.1678556441,0.2248390995,0.6209602303,0.7322087358,0.8985482829,0.1126221246,0.2806308582,-5.588910716,-0.945389834,-0.613240418,-3.748776053,-2.641859419,-2.766095571,11.659016024,-2.751804116,-0.844665935,10.495594096,-5.422903467,-0.667334001,-0.334494774,-3.580920408,-2.41702032,-2.145135341,12.39122476,-1.853255834,-0.73204381,10.776224954 +050,3,7,05,049,Arkansas,Fulton County,12245,12231,12210,12236,12170,12175,12090,12149,12112,12147,12351,12516,12381,-21,26,-66,5,-85,59,-37,35,204,165,-135,31,95,120,117,109,113,111,122,122,123,119,70,167,151,152,181,154,171,191,184,198,223,-39,-72,-31,-35,-72,-41,-60,-69,-62,-75,-104,1,-1,-2,-1,6,11,12,7,3,4,2,17,100,-33,43,-19,89,12,96,264,237,-32,18,99,-35,42,-13,100,24,103,267,241,-30,0,-1,0,-2,0,0,-1,1,-1,-1,-1,165,165,165,165,165,165,165,165,165,165,165,165,7.7722326761,9.8336474637,9.6118299445,8.9841335257,9.3238169891,9.1504884382,10.058122759,9.9599967344,9.8926287851,9.5593846648,13.662766915,12.374006392,12.487163689,14.918607047,12.706794835,14.096698405,15.746733171,15.021634419,15.924719508,17.913804876,-5.890534239,-2.540358928,-2.875333744,-5.934473522,-3.382977846,-4.946209967,-5.688610413,-5.061637685,-6.032090723,-8.354420211,-0.081812976,-0.163894124,-0.082152393,0.4945394601,0.9076282025,0.9892419933,0.5771054042,0.2449179525,0.3217115052,0.1606619271,8.1812975538,-2.704253053,3.5325528856,-1.566041624,7.3435372746,0.9892419933,7.9145884002,21.552779819,19.061406684,-2.570590834,8.0994845783,-2.868147177,3.4504004929,-1.071502164,8.2511654771,1.9784839866,8.4916938044,21.797697771,19.383118189,-2.409928907 +050,3,7,05,051,Arkansas,Garland County,96024,96003,96080,96884,97043,97734,97851,97930,98356,98476,99121,99472,99789,77,804,159,691,117,79,426,120,645,351,317,293,1152,1079,1112,1078,1096,1059,1133,1125,1035,1043,365,1340,1333,1410,1301,1387,1374,1390,1445,1384,1445,-72,-188,-254,-298,-223,-291,-315,-257,-320,-349,-402,11,13,-6,11,9,58,51,17,-13,13,12,137,979,428,965,349,321,694,366,980,686,711,148,992,422,976,358,379,745,383,967,699,723,1,0,-9,13,-18,-9,-4,-6,-2,1,-4,2166,2168,2164,2167,2167,2171,2174,2169,2165,2165,2164,2164,11.940050994,11.127898642,11.418185925,11.023340236,11.196183491,10.790377307,11.512355715,11.386812553,10.423328113,10.468681779,13.888600983,13.747441047,14.478095463,13.303678707,14.168892793,13.999979622,14.12371972,14.625728123,13.938054211,14.503590768,-1.948549989,-2.619542405,-3.059909538,-2.280338472,-2.972709303,-3.209602315,-2.611364006,-3.238915571,-3.514726098,-4.034908989,0.1347401588,-0.061878954,0.1129496809,0.0920315975,0.5924987614,0.5196498986,0.1727361405,-0.131580945,0.1309210294,0.1204450444,10.146970419,4.4140320842,9.9087674623,3.568780837,3.2791741793,7.0713143067,3.7189074947,9.9191789349,6.9086020152,7.136368883,10.281710578,4.3521531298,10.021717143,3.6608124345,3.8716729407,7.5909642053,3.8916436352,9.7875979898,7.0395230446,7.2568139275 +050,3,7,05,053,Arkansas,Grant County,17853,17842,17887,17950,18039,18047,18084,18031,18080,18118,18209,18287,18449,45,63,89,8,37,-53,49,38,91,78,162,47,189,206,217,168,199,188,181,183,180,182,31,194,192,183,172,196,204,196,189,194,201,16,-5,14,34,-4,3,-16,-15,-6,-14,-19,1,24,5,1,1,-2,-4,-3,-3,-3,0,29,44,71,-29,44,-53,70,56,102,94,181,30,68,76,-28,45,-55,66,53,99,91,181,-1,0,-1,2,-4,-1,-1,0,-2,1,0,143,143,143,143,143,143,143,143,143,143,143,143,10.547757904,11.447942427,12.026824807,9.2994935097,11.020351654,10.41233973,10.000552517,10.075150714,9.8640946953,9.9085365854,10.826799118,10.669926922,10.14243751,9.5209100219,10.8542157,11.298496303,10.829327587,10.405483525,10.63130206,10.942944251,-0.279041214,0.7780155047,1.884387297,-0.221416512,0.1661359546,-0.886156573,-0.82877507,-0.33033281,-0.767207365,-1.034407666,1.3393978291,0.2778626803,0.0554231558,0.055354128,-0.110757303,-0.221539143,-0.165755014,-0.165166405,-0.164401578,0,2.4555626866,3.9456500597,-1.607271518,2.4355816335,-2.935068531,3.876935006,3.0940935963,5.6156577752,5.151249452,9.8540940767,3.7949605157,4.22351274,-1.551848362,2.4909357615,-3.045825834,3.6553958628,2.9283385822,5.4504913701,4.9868478737,9.8540940767 +050,3,7,05,055,Arkansas,Greene County,42090,42090,42202,42767,43237,43176,43809,44321,44733,45002,45339,45316,45597,112,565,470,-61,633,512,412,269,337,-23,281,129,539,577,571,549,602,574,580,583,535,534,92,453,458,504,467,450,490,513,512,506,539,37,86,119,67,82,152,84,67,71,29,-5,0,14,33,21,17,3,-7,-9,-11,-11,-4,74,465,316,-143,526,360,336,210,278,-42,290,74,479,349,-122,543,363,329,201,267,-53,286,1,0,2,-6,8,-3,-1,1,-1,1,0,602,602,602,602,602,602,602,602,602,602,602,601,12.686979957,13.417980559,13.215604134,12.622866011,13.661636219,12.891054866,12.92695158,12.906653679,11.802989355,11.747494858,10.662712283,10.650667411,11.66491153,10.737483474,10.212186543,11.004559032,11.433665794,11.334831361,11.163201147,11.857490128,2.0242676741,2.7673131482,1.5506926041,1.8853825372,3.4494496766,1.886495834,1.4932857859,1.5718223177,0.639788208,-0.10999527,0.3295319469,0.7674061672,0.4860379804,0.3908719894,0.0680812436,-0.157207986,-0.200590628,-0.243521768,-0.242678286,-0.087996216,10.945168238,7.3484954188,-3.3096872,12.094039202,8.1697492341,7.545983336,4.6804479857,6.1544592156,-0.926589819,6.3797256718,11.274700185,8.115901586,-2.823649219,12.484911192,8.2378304777,7.3887753498,4.4798573578,5.9109374481,-1.169268104,6.2917294556 +050,3,7,05,057,Arkansas,Hempstead County,22609,22593,22604,22498,22355,22434,22339,22095,22047,21895,21714,21568,21253,11,-106,-143,79,-95,-244,-48,-152,-181,-146,-315,103,319,339,315,321,328,321,314,293,289,274,47,251,246,233,235,247,222,237,275,264,251,56,68,93,82,86,81,99,77,18,25,23,0,-15,-17,-3,-14,0,-7,-4,-10,1,2,-47,-159,-227,3,-168,-325,-138,-224,-191,-173,-337,-47,-174,-244,0,-182,-325,-145,-228,-201,-172,-335,2,0,8,-3,1,0,-2,-1,2,1,-3,301,301,301,301,301,301,301,301,301,301,301,301,14.145714159,15.116045749,14.065953694,14.33899895,14.763469415,14.543971728,14.291566155,13.437593157,13.354281225,12.797459191,11.130326815,10.969165942,10.404340351,10.497397985,11.117612639,10.058447737,10.786946429,12.612075489,12.199066587,11.723219915,3.0153873442,4.1468798074,3.6616133426,3.8416009649,3.6458567763,4.4855239908,3.504619726,0.8255176684,1.1552146389,1.0742392751,-0.665158973,-0.758031793,-0.133961464,-0.625376901,0,-0.317158262,-0.182058168,-0.458620927,0.0462085856,0.0934121109,-7.050685114,-10.12195394,0.1339614638,-7.504522815,-14.62843768,-6.252548593,-10.19525738,-8.759659703,-7.994085301,-15.73994068,-7.715844087,-10.87998573,0,-8.129899716,-14.62843768,-6.569706855,-10.37731555,-9.21828063,-7.947876715,-15.64652857 +050,3,7,05,059,Arkansas,Hot Spring County,32923,33016,33236,33145,33512,33534,33418,33511,33452,33630,33680,33784,33787,220,-91,367,22,-116,93,-59,178,50,104,3,76,381,330,358,336,372,348,365,356,375,361,55,356,381,388,414,422,396,419,474,380,410,21,25,-51,-30,-78,-50,-48,-54,-118,-5,-49,2,7,3,16,3,6,8,8,4,12,10,177,-123,395,42,-32,138,-16,224,165,98,41,179,-116,398,58,-29,144,-8,232,169,110,51,20,0,20,-6,-9,-1,-3,0,-1,-1,1,1571,1752,1675,2149,2136,2135,2270,2275,2345,2336,2326,2162,11.479188322,9.9014357082,10.679235152,10.037041463,11.116257527,10.393799561,10.88220387,10.577923043,11.117040199,10.685057199,10.725960742,11.43165759,11.574143126,12.367068945,12.610378162,11.827427087,12.492173757,14.084088546,11.265267402,12.135383523,0.7532275802,-1.530221882,-0.894907974,-2.330027482,-1.494120635,-1.433627526,-1.609969888,-3.506165503,-0.148227203,-1.450326323,0.2109037225,0.0900130519,0.4772842526,0.0896164416,0.1792944762,0.2389379209,0.2385140574,0.1188530679,0.3557452864,0.295984964,-3.705879694,11.851718499,1.2528711631,-0.955908711,4.1237729534,-0.477875842,6.6783936078,4.9026890507,2.9052531721,1.2135383523,-3.494975972,11.941731551,1.7301554157,-0.866292269,4.3030674297,-0.238937921,6.9169076652,5.0215421186,3.2609984584,1.5095233162 +050,3,7,05,061,Arkansas,Howard County,13789,13780,13798,13817,13676,13541,13489,13332,13347,13361,13297,13219,13109,18,19,-141,-135,-52,-157,15,14,-64,-78,-110,48,187,192,186,190,176,187,197,169,158,165,33,163,161,184,161,177,160,163,174,164,177,15,24,31,2,29,-1,27,34,-5,-6,-12,3,12,7,21,6,5,0,-1,-6,5,6,1,-15,-183,-161,-87,-163,-11,-19,-53,-76,-104,4,-3,-176,-140,-81,-158,-11,-20,-59,-71,-98,-1,-2,4,3,0,2,-1,0,0,-1,0,181,181,181,181,181,181,181,181,181,181,181,181,13.543364114,13.967191649,13.667928133,14.05845357,13.124044592,14.018516436,14.752134192,12.679120714,11.917332931,12.534184139,11.805178345,11.712072164,13.520961164,11.912689604,13.198613027,11.994452566,12.206080575,13.054242629,12.369889878,13.445761167,1.7381857686,2.255119485,0.1469669692,2.145763966,-0.074568435,2.0240638705,2.5460536169,-0.375121915,-0.452556947,-0.911577028,0.8690928843,0.5092205289,1.5431531763,0.4439511654,0.3728421759,0,-0.07488393,-0.450146298,0.377130789,0.4557885141,-1.086366105,-13.31247954,-11.83084102,-6.437291898,-12.15465493,-0.824618614,-1.422794668,-3.976292295,-5.732387992,-7.900334245,-0.217273221,-12.80325901,-10.28768784,-5.993340733,-11.78181276,-0.824618614,-1.497678598,-4.426438593,-5.355257203,-7.444545731 +050,3,7,05,063,Arkansas,Independence County,36647,36643,36811,36887,36961,36899,37095,37055,37121,37416,37799,37819,37757,168,76,74,-62,196,-40,66,295,383,20,-62,120,453,482,474,457,455,464,468,527,415,431,101,389,403,418,393,472,410,457,406,410,461,19,64,79,56,64,-17,54,11,121,5,-30,6,79,18,40,2,13,9,11,-1,15,13,132,-66,-17,-153,136,-32,6,275,264,-1,-45,138,13,1,-113,138,-19,15,286,263,14,-32,11,-1,-6,-5,-6,-4,-3,-2,-1,1,0,900,988,922,937,919,1035,1023,995,955,966,956,957,12.293413661,13.053840321,12.83509342,12.352352893,12.272420769,12.51078516,12.557521768,14.013162268,10.976222593,11.405737271,10.556595837,10.914310476,11.318711075,10.622482904,12.730950775,11.054788611,12.262366342,10.795718939,10.843978947,12.199640097,1.7368178241,2.1395298451,1.516382345,1.7298699895,-0.458530007,1.4559965487,0.2951554262,3.2174433291,0.1322436457,-0.793902826,2.1438845016,0.4874878128,1.0831302464,0.0540584372,0.3506405934,0.2426660915,0.2951554262,-0.026590441,0.3967309371,0.3440245581,-1.791093381,-0.460405157,-4.142973193,3.6759737276,-0.863115307,0.1617773943,7.3788856541,7.0198763545,-0.026448729,-1.190854239,0.3527911205,0.0270826563,-3.059842946,3.7300321648,-0.512474713,0.4044434858,7.6740410803,6.9932859137,0.3702822079,-0.846829681 +050,3,7,05,065,Arkansas,Izard County,13696,13708,13732,13579,13548,13420,13566,13495,13500,13673,13574,13620,13613,24,-153,-31,-128,146,-71,5,173,-99,46,-7,36,114,122,124,118,97,112,121,111,132,125,21,196,182,198,194,203,172,200,215,190,202,15,-82,-60,-74,-76,-106,-60,-79,-104,-58,-77,1,6,14,7,12,8,3,1,0,1,0,10,-77,16,-60,203,27,62,252,7,104,71,11,-71,30,-53,215,35,65,253,7,105,71,-2,0,-1,-1,7,0,0,-1,-2,-1,-1,769,769,769,769,769,941,992,1012,997,1005,1018,944,8.348284574,8.9947284993,9.196084248,8.7452753279,7.1689885814,8.297832932,8.9058992382,8.1476859838,9.7080238288,9.1800389234,14.353191022,13.418365466,14.684070009,14.377825539,15.003141052,12.743100574,14.720494609,15.781553933,13.973670663,14.8349429,-6.004906448,-4.423636967,-5.487985761,-5.632550211,-7.83415247,-4.445267642,-5.81459537,-7.633867949,-4.265646834,-5.654903977,0.4393833986,1.0321819589,0.5191337882,0.8893500334,0.5912567902,0.2222633821,0.073602473,0,0.0735456351,0,-5.638753616,1.1796365245,-4.449718185,15.044838064,1.995491667,4.5934432302,18.547823207,0.513818035,7.6487460469,5.2142621085,-5.199370217,2.2118184834,-3.930584396,15.934188098,2.5867484572,4.8157066123,18.62142568,0.513818035,7.722291682,5.2142621085 +050,3,7,05,067,Arkansas,Jackson County,17997,18005,18066,17898,17691,17741,17608,17386,17314,17033,16776,16782,16636,61,-168,-207,50,-133,-222,-72,-281,-257,6,-146,44,184,209,207,201,174,217,200,196,174,187,36,234,237,241,211,240,218,258,252,194,227,8,-50,-28,-34,-10,-66,-1,-58,-56,-20,-40,0,0,4,3,2,-1,-2,-2,-2,-2,-1,46,-118,-187,81,-125,-153,-68,-222,-200,29,-105,46,-118,-183,84,-123,-154,-70,-224,-202,27,-106,7,0,4,0,0,-2,-1,1,1,-1,0,2000,2072,2027,2000,2078,2132,2220,2263,2215,2211,2239,2117,10.232454677,11.745202169,11.684353127,11.372316049,9.9445619249,12.507204611,11.64584971,11.594545831,10.370105489,11.191573404,13.013013013,13.318722077,13.60352224,11.938102917,13.716637138,12.564841499,15.023146126,14.907273211,11.562071637,13.585492848,-2.780558336,-1.573519908,-1.919169113,-0.565786868,-3.772075213,-0.057636888,-3.377296416,-3.31272738,-1.191966148,-2.393919445,0,0.2247885583,0.1693384511,0.1131573736,-0.057152655,-0.115273775,-0.116458497,-0.118311692,-0.119196615,-0.059847986,-6.562117673,-10.5088651,4.5721381802,-7.072335851,-8.744356175,-3.919308357,-12.92689318,-11.83116922,1.7283509148,-6.284038542,-6.562117673,-10.28407654,4.7414766313,-6.959178477,-8.80150883,-4.034582133,-13.04335168,-11.94948091,1.6091543,-6.343886528 +050,3,7,05,069,Arkansas,Jefferson County,77435,77429,77332,76039,74658,73233,72504,71920,70512,69350,68241,67137,65377,-97,-1293,-1381,-1425,-729,-584,-1408,-1162,-1109,-1104,-1760,254,974,902,947,958,948,928,841,836,814,789,188,781,844,856,819,880,881,859,818,847,880,66,193,58,91,139,68,47,-18,18,-33,-91,2,19,29,24,25,39,60,41,22,35,27,-170,-1515,-1523,-1577,-906,-689,-1521,-1189,-1152,-1103,-1684,-168,-1496,-1494,-1553,-881,-650,-1461,-1148,-1130,-1068,-1657,5,10,55,37,13,-2,6,4,3,-3,-12,5530,5531,5316,4806,4574,4718,5221,5326,5406,5423,5498,5351,12.701227742,11.971041228,12.80672928,13.146970227,13.128011965,13.0307796,12.026140052,12.151957614,12.025587614,11.90817574,10.184454688,11.201284697,11.576093204,11.239424443,12.18634022,12.370815547,12.283536629,11.890312593,12.513111436,13.281615527,2.5167730536,0.7697565313,1.2306360766,1.9075457845,0.9416717443,0.659964053,-0.257396577,0.2616450204,-0.487523822,-1.373439787,0.2477652229,0.3848782657,0.3245633609,0.3430837742,0.5400764416,0.8425073017,0.5862922023,0.3197883583,0.5170707205,0.4075041128,-19.75601646,-20.21274478,-21.3265175,-12.43335598,-9.541350468,-21.3575601,-17.00247387,-16.7452813,-16.29511442,-25.41618244,-19.50825123,-19.82786651,-21.00195414,-12.0902722,-9.001274026,-20.5150528,-16.41618166,-16.42549295,-15.7780437,-25.00867833 +050,3,7,05,071,Arkansas,Johnson County,25540,25544,25560,25683,25921,25941,25976,26103,26160,26423,26684,26596,26513,16,123,238,20,35,127,57,263,261,-88,-83,93,331,367,362,349,339,385,343,338,349,329,80,257,248,294,226,274,259,285,263,269,271,13,74,119,68,123,65,126,58,75,80,58,7,63,43,35,19,30,21,15,-3,19,20,0,-12,80,-79,-108,36,-89,192,189,-188,-163,7,51,123,-44,-89,66,-68,207,186,-169,-143,-4,-2,-4,-4,1,-4,-1,-2,0,1,2,558,558,551,520,556,555,580,579,619,690,626,626,12.918837695,14.223703589,13.960124947,13.444536472,13.018683154,14.733176435,13.046041496,12.729018773,13.100600601,12.389613813,10.030638331,9.611658011,11.337781034,8.7062041335,10.52247547,9.9114096014,10.840005325,9.9045323592,10.097597598,10.205426576,2.8881993638,4.6120455779,2.6223439127,4.7383323382,2.4962076845,4.8217668331,2.2060361714,2.8244864142,3.003003003,2.1841872376,2.4588724314,1.6665374777,1.3497358374,0.7319375156,1.1520958544,0.8036278055,0.570526596,-0.112979457,0.7132132132,0.753168013,-0.468356654,3.1005348423,-3.046546604,-4.160486931,1.3825150253,-3.405851176,7.3027404294,7.1177057638,-7.057057057,-6.138319306,1.9905157778,4.76707232,-1.696810767,-3.428549415,2.5346108796,-2.60222337,7.8732670255,7.0047263073,-6.343843844,-5.385151293 +050,3,7,05,073,Arkansas,Lafayette County,7645,7634,7638,7528,7444,7279,7157,7009,6895,6807,6684,6656,6596,4,-110,-84,-165,-122,-148,-114,-88,-123,-28,-60,20,74,66,59,82,73,79,79,65,69,66,10,119,89,120,108,105,85,110,87,91,103,10,-45,-23,-61,-26,-32,-6,-31,-22,-22,-37,0,4,0,5,6,3,5,7,3,14,8,-6,-69,-62,-110,-102,-121,-113,-62,-106,-20,-31,-6,-65,-62,-105,-96,-118,-108,-55,-103,-6,-23,0,0,1,1,0,2,0,-2,2,0,0,111,111,113,115,110,113,113,113,97,105,103,82,9.7586707108,8.8164573871,8.014670923,11.36048767,10.306367358,11.363636364,11.531163334,9.6360536654,10.344827586,9.9607606399,15.692997494,11.888859204,16.301025606,14.962593516,14.824227022,12.226697353,16.056050212,12.897487214,13.643178411,15.544823423,-5.934326784,-3.072401817,-8.286354683,-3.602105846,-4.517859664,-0.86306099,-4.524886878,-3.261433548,-3.298350825,-5.584062783,0.5274957141,0,0.6792094003,0.8312551953,0.4235493435,0.7192174914,1.0217486498,0.4447409384,2.0989505247,1.207364926,-9.099301068,-8.282126636,-14.94260681,-14.13133832,-17.08315685,-16.2543153,-9.049773756,-15.71417982,-2.99850075,-4.678539088,-8.571805354,-8.282126636,-14.26339741,-13.30008313,-16.65960751,-15.53509781,-8.028025106,-15.26943889,-0.899550225,-3.471174162 +050,3,7,05,075,Arkansas,Lawrence County,17415,17410,17518,17281,17040,17051,16970,16705,16662,16588,16452,16440,16410,108,-237,-241,11,-81,-265,-43,-74,-136,-12,-30,50,166,190,185,200,197,195,183,211,182,185,37,233,248,223,261,222,243,263,247,235,276,13,-67,-58,-38,-61,-25,-48,-80,-36,-53,-91,1,5,1,3,3,5,6,2,-1,0,2,85,-176,-189,48,-18,-248,1,5,-100,42,59,86,-171,-188,51,-15,-243,7,7,-101,42,61,9,1,5,-2,-5,3,-2,-1,1,-1,0,595,674,651,634,630,684,653,613,653,662,691,691,9.5405040375,11.071938463,10.853304391,11.757443932,11.700074239,11.688194923,11.007518797,12.772397094,11.066520735,11.263318113,13.391189402,14.451793363,13.08263178,15.343464331,13.184855234,14.565289058,15.819548872,14.95157385,14.289188861,16.803652968,-3.850685365,-3.379854899,-2.229327388,-3.586020399,-1.484780995,-2.877094135,-4.812030075,-2.179176755,-3.222668126,-5.540334855,0.2873645794,0.0582733603,0.1759995307,0.176361659,0.296956199,0.3596367669,0.1203007519,-0.060532688,0,0.1217656012,-10.1152332,-11.0136651,2.8159924907,-1.058169954,-14.72902747,0.0599394611,0.3007518797,-6.053268765,2.5538124772,3.5920852359,-9.827868617,-10.95539174,2.9919920214,-0.881808295,-14.43207127,0.419576228,0.4210526316,-6.113801453,2.5538124772,3.7138508371 +050,3,7,05,077,Arkansas,Lee County,10424,10430,10388,10282,10174,9996,9827,9660,9330,9121,8962,8889,8513,-42,-106,-108,-178,-169,-167,-330,-209,-159,-73,-376,20,104,112,98,107,106,103,86,93,78,81,22,113,146,147,123,123,112,115,114,95,121,-2,-9,-34,-49,-16,-17,-9,-29,-21,-17,-40,3,0,1,1,0,0,3,6,1,14,12,-46,-97,-78,-131,-155,-150,-326,-187,-139,-70,-345,-43,-97,-77,-130,-155,-150,-323,-181,-138,-56,-333,3,0,3,1,2,0,2,1,0,0,-3,1756,1719,1725,1720,1747,1739,1745,1757,1748,1738,1736,1624,10.062893082,10.950332421,9.7174020823,10.795540534,10.87904757,10.847814639,9.3219879681,10.285903888,8.7390062181,9.309274796,10.933720368,14.274540477,14.576103123,12.409826969,12.623800482,11.795681938,12.465449027,12.608527346,10.64366142,13.906447535,-0.870827286,-3.324208056,-4.858701041,-1.614286435,-1.744752912,-0.947867299,-3.143461059,-2.322623458,-1.904655201,-4.597172739,0,0.0977708252,0.0991571641,0,0,0.3159557662,0.6503712536,0.1106011171,1.5685395776,1.3791518216,-9.38558297,-7.626124364,-12.9895885,-15.63839984,-15.39487864,-34.33385993,-20.26990407,-15.37355527,-7.842697888,-39.65061487,-9.38558297,-7.528353539,-12.89043133,-15.63839984,-15.39487864,-34.01790416,-19.61953282,-15.26295416,-6.27415831,-38.27146305 +050,3,7,05,079,Arkansas,Lincoln County,14134,14141,14090,14344,14186,14070,14034,13872,13745,13481,13208,13012,12944,-51,254,-158,-116,-36,-162,-127,-264,-273,-196,-68,33,124,131,107,126,91,130,111,121,119,126,19,115,108,153,123,125,131,153,162,141,167,14,9,23,-46,3,-34,-1,-42,-41,-22,-41,1,3,-2,-3,-7,8,4,9,0,25,19,-71,239,-184,-67,-29,-136,-130,-232,-234,-200,-46,-70,242,-186,-70,-36,-128,-126,-223,-234,-175,-27,5,3,5,0,-3,0,0,1,2,1,0,3445,3411,3693,3684,3706,3748,3790,3801,3738,3549,3450,3519,8.721952592,9.1833158079,7.573612684,8.9666951324,6.521894933,9.4144910743,8.1539704694,9.0674060474,9.0770404272,9.7087378641,8.0889076458,7.570977918,10.829558324,8.7532023911,8.958646886,9.4869102364,11.239256593,12.13983289,10.755148741,12.867930344,0.6330449462,1.6123378899,-3.25594564,0.2134927412,-2.436751953,-0.072419162,-3.085286124,-3.072426843,-1.678108314,-3.15919248,0.2110149821,-0.140203295,-0.212344281,-0.49814973,0.5733534007,0.2896766484,0.6611327408,0,1.9069412662,1.4640160271,16.810860238,-12.89870312,-4.742355606,-2.063763165,-9.747007812,-9.414491074,-17.04253287,-17.53531417,-15.25553013,-3.544459855,17.02187522,-13.03890641,-4.954699887,-2.561912895,-9.173654411,-9.124814426,-16.38140013,-17.53531417,-13.34858886,-2.080443828 +050,3,7,05,081,Arkansas,Little River County,13171,13168,13133,12949,12926,12743,12515,12417,12435,12386,12357,12368,12180,-35,-184,-23,-183,-228,-98,18,-49,-29,11,-188,45,126,138,141,157,116,153,142,156,148,155,57,171,156,144,162,165,184,170,156,166,182,-12,-45,-18,-3,-5,-49,-31,-28,0,-18,-27,0,-2,-2,-4,-3,-2,-2,-4,-4,-4,-3,-25,-136,-1,-180,-224,-47,52,-16,-26,33,-156,-25,-138,-3,-184,-227,-49,50,-20,-30,29,-159,2,-1,-2,4,4,0,-1,-1,1,0,-2,123,123,123,123,123,123,124,123,123,123,123,123,9.6618357488,10.666666667,10.986014258,12.431704806,9.3053104444,12.312892323,11.441924177,12.609626965,11.971688574,12.628320026,13.112491373,12.057971014,11.219759243,12.827618972,13.236001925,14.807661355,13.69807824,12.609626965,13.427704752,14.828091902,-3.450655625,-1.391304348,-0.233744984,-0.395914166,-3.930691481,-2.494769033,-2.256154063,0,-1.456016178,-2.199771876,-0.153362472,-0.154589372,-0.311659979,-0.237548499,-0.160436387,-0.160952841,-0.322307723,-0.323323768,-0.323559151,-0.244419097,-10.42864811,-0.077294686,-14.02469905,-17.73695463,-3.770255094,4.1847738613,-1.289230893,-2.101604494,2.6693629929,-12.70979306,-10.58201058,-0.231884058,-14.33635903,-17.97450313,-3.930691481,4.0238210204,-1.611538616,-2.424928263,2.3458038423,-12.95421216 +050,3,7,05,083,Arkansas,Logan County,22353,22361,22307,22241,21928,22034,21866,21728,21743,21740,21705,21495,21410,-54,-66,-313,106,-168,-138,15,-3,-35,-210,-85,53,258,271,260,223,290,302,269,252,251,243,96,264,261,270,294,302,288,273,286,283,312,-43,-6,10,-10,-71,-12,14,-4,-34,-32,-69,3,0,21,40,37,37,20,9,2,8,6,-12,-60,-353,80,-132,-164,-16,-7,-2,-185,-22,-9,-60,-332,120,-95,-127,4,2,0,-177,-16,-2,0,9,-4,-2,1,-3,-1,-1,-1,0,580,580,580,582,582,581,576,578,580,580,579,575,11.583011583,12.271049831,11.828397252,10.159453303,13.3045832,13.894320351,12.372651381,11.600874669,11.62037037,11.327351125,11.852383945,11.818243564,12.283335608,13.394077449,13.855117677,13.250212786,12.556631327,13.166072045,13.101851852,14.543759469,-0.269372362,0.4528062668,-0.454938356,-3.234624146,-0.550534477,0.644107566,-0.183979946,-1.565197376,-1.481481481,-3.216408344,0,0.9508931604,1.8197534234,1.6856492027,1.6974813048,0.9201536657,0.4139548789,0.0920704339,0.3703703704,0.2796876821,-2.693723624,-15.98406122,3.6395068468,-6.013667426,-7.523971189,-0.736122933,-0.321964906,-0.092070434,-8.564814815,-1.025521501,-2.693723624,-15.03316806,5.4592602702,-4.328018223,-5.826489884,0.1840307331,0.0919899731,0,-8.194444444,-0.745833819 +050,3,7,05,085,Arkansas,Lonoke County,68356,68375,68739,69537,70131,70775,71408,71409,71845,72843,73560,73648,73921,364,798,594,644,633,1,436,998,717,88,273,230,974,958,954,962,980,963,919,885,907,888,103,602,602,638,576,674,672,693,698,687,755,127,372,356,316,386,306,291,226,187,220,133,43,134,164,105,126,117,40,12,-14,0,6,186,293,89,235,135,-421,108,762,547,-135,128,229,427,253,340,261,-304,148,774,533,-135,134,8,-1,-15,-12,-14,-1,-3,-2,-3,3,6,572,572,572,572,572,572,572,572,572,573,572,572,14.087766496,13.718246127,13.540942188,13.531856832,13.723856404,13.44465076,12.703195842,12.08991619,12.322699853,12.035048011,8.7072232347,8.6204427643,9.0556825117,8.1022344443,9.4386522613,9.3819369791,9.5792325556,9.5353237297,9.3337318624,10.232501406,5.3805432613,5.0978033623,4.4852596767,5.429622388,4.2852041424,4.0627137811,3.1239632865,2.5545924605,2.9889679909,1.8025466053,1.9381526801,2.348426268,1.4903552723,1.7723637847,1.6384604074,0.5584486297,0.1658741568,-0.191252911,0,0.081317892,4.2379010096,1.2744508406,3.335557038,1.8989611979,-5.89565668,1.5078113002,10.533008957,7.4725244701,-1.834139449,1.7347816953,6.1760536897,3.6228771086,4.8259123103,3.6713249826,-4.257196272,2.0662599299,10.698883114,7.2812715586,-1.834139449,1.8160995873 +050,3,7,05,087,Arkansas,Madison County,15717,15725,15686,15665,15604,15690,15741,15719,16136,16307,16359,16519,16644,-39,-21,-61,86,51,-22,417,171,52,160,125,47,166,206,193,209,183,230,234,208,168,195,64,180,165,149,168,193,168,227,193,175,157,-17,-14,41,44,41,-10,62,7,15,-7,38,2,6,6,4,17,17,10,9,7,8,5,-25,-13,-108,39,-6,-27,344,156,32,158,82,-23,-7,-102,43,11,-10,354,165,39,166,87,1,0,0,-1,-1,-2,1,-1,-2,1,0,79,79,79,79,79,79,79,79,79,79,79,79,10.589773851,13.175988999,12.334632837,13.298972352,11.633820725,14.440433213,14.425299756,12.734953775,10.219599732,11.760094081,11.482887308,10.553583421,9.5225921902,10.690083039,12.269548633,10.547794695,13.993773695,11.816567685,10.645416388,9.4683834394,-0.893113457,2.6224055774,2.8120406468,2.6088893131,-0.635727908,3.8926385183,0.4315260611,0.9183860895,-0.425816656,2.2917106414,0.3827629103,0.3837666699,0.2556400588,1.0817345932,1.0807374444,0.6278449223,0.5548192214,0.4285801751,0.4866476063,0.3015408739,-0.829319639,-6.907800058,2.4924905733,-0.38178868,-1.716465353,21.597865327,9.6168665043,1.9592236576,9.6112902245,4.9452703314,-0.446556729,-6.524033388,2.7481306321,0.6999459133,-0.635727908,22.22571025,10.171685726,2.3878038327,10.097937831,5.2468112053 +050,3,7,05,089,Arkansas,Marion County,16653,16644,16665,16676,16628,16449,16428,16226,16408,16458,16631,16645,16790,21,11,-48,-179,-21,-202,182,50,173,14,145,41,159,154,141,156,148,174,154,154,137,141,35,236,225,258,253,262,250,268,285,265,300,6,-77,-71,-117,-97,-114,-76,-114,-131,-128,-159,2,5,8,1,3,16,22,10,1,2,5,14,84,17,-60,75,-102,235,154,303,139,303,16,89,25,-59,78,-86,257,164,304,141,308,-1,-1,-2,-3,-2,-2,1,0,0,1,-4,141,141,141,141,141,141,141,141,141,141,141,141,9.5378063045,9.2481383618,8.5255615685,9.4899169632,9.0647393887,10.663724949,9.3713868435,9.3082293209,8.2341627599,8.4342754598,14.156743949,13.511890464,15.599963721,15.390698665,16.047038648,15.321443893,16.308647234,17.226268548,15.92739512,17.945266936,-4.618937644,-4.263752102,-7.074402153,-5.900781701,-6.982299259,-4.657718943,-6.937260391,-7.918039228,-7.69323236,-9.510991476,0.2999310159,0.480422772,0.0604649757,0.1824984031,0.9799718258,1.3482870626,0.6085316132,0.0604430475,0.1202067556,0.2990877823,5.0388410666,1.0208983906,-3.62789854,4.5624600785,-6.24732039,14.402157259,9.3713868435,18.314243404,8.3543695156,18.124719605,5.3387720824,1.5013211626,-3.567433564,4.7449584816,-5.267348564,15.750444322,9.9799184568,18.374686452,8.4745762712,18.423807387 +050,3,7,05,091,Arkansas,Miller County,43462,43462,43568,43777,43686,43439,43509,43858,43776,43819,43431,43370,43177,106,209,-91,-247,70,349,-82,43,-388,-61,-193,164,636,601,607,605,611,593,590,551,538,524,74,448,444,506,427,434,532,502,537,493,495,90,188,157,101,178,177,61,88,14,45,29,4,-1,-7,-20,-2,-12,-12,-19,-21,-21,-14,15,23,-237,-327,-98,187,-128,-23,-381,-84,-210,19,22,-244,-347,-100,175,-140,-42,-402,-105,-224,-3,-1,-4,-1,-8,-3,-3,-3,0,-1,2,1480,1480,1480,1417,1462,1470,1470,1470,1472,1452,1470,1339,14.562940065,13.742954163,13.934002869,13.916363804,13.986974487,13.533560034,13.471088532,12.630372493,12.396170551,12.109027465,10.258171618,10.15286464,11.615494978,9.8219625523,9.9351013541,12.141406303,11.461841429,12.309455587,11.359316137,11.438871365,4.304768447,3.5900895236,2.318507891,4.0944012513,4.0518731329,1.3921537303,2.0092471031,0.3209169054,1.0368544141,0.6701561002,-0.022897705,-0.160067686,-0.459110473,-0.046004508,-0.274703263,-0.273866308,-0.433814715,-0.481375358,-0.483865393,-0.323523635,0.5266472036,-5.419434504,-7.506456241,-2.254220914,4.2807925189,-2.921240614,-0.525144129,-8.733524355,-1.935461573,-4.852854518,0.5037494991,-5.579502189,-7.965566714,-2.300225422,4.0060892557,-3.195106922,-0.958958845,-9.214899713,-2.419326966,-5.176378153 +050,3,7,05,093,Arkansas,Mississippi County,46480,46480,46350,45988,45499,44642,44203,43692,42863,42093,41239,40717,40066,-130,-362,-489,-857,-439,-511,-829,-770,-854,-522,-651,176,649,686,599,674,677,642,625,585,598,563,167,526,524,506,482,500,492,540,538,505,532,9,123,162,93,192,177,150,85,47,93,31,7,18,2,16,5,7,0,4,-7,6,7,-150,-504,-666,-987,-646,-703,-984,-863,-898,-620,-688,-143,-486,-664,-971,-641,-696,-984,-859,-905,-614,-681,4,1,13,21,10,8,5,4,4,-1,-1,767,789,787,771,769,793,798,807,811,788,802,767,14.057051268,14.996666193,13.290289657,15.172491418,15.404744297,14.834498296,14.713498752,14.040224644,14.593196349,13.938576186,11.392925989,11.455179424,11.226855704,10.850357364,11.377211445,11.368494021,12.712462922,12.912206595,12.32368588,13.171087976,2.6641252789,3.5414867686,2.0634339535,4.3221340537,4.0275328517,3.4660042747,2.0010358303,1.1280180483,2.269510469,0.7674882092,0.389871992,0.0437220589,0.3549993898,0.1125555743,0.1592809602,0,0.094166392,-0.168002688,0.1464200303,0.1733037892,-10.91641578,-14.5594456,-21.89902486,-14.5421802,-15.99635929,-22.73698804,-20.31639908,-21.55234484,-15.13006979,-17.03328671,-10.52654378,-14.51572355,-21.54402547,-14.42962463,-15.83707833,-22.73698804,-20.22223269,-21.72034753,-14.98364976,-16.85998292 +050,3,7,05,095,Arkansas,Monroe County,8149,8155,8138,8099,7856,7693,7636,7454,7195,7012,6880,6723,6584,-17,-39,-243,-163,-57,-182,-259,-183,-132,-157,-139,30,107,84,86,100,98,86,88,102,107,104,9,105,110,111,116,126,125,140,114,109,124,21,2,-26,-25,-16,-28,-39,-52,-12,-2,-20,0,-1,0,0,0,0,0,0,0,0,0,-39,-41,-225,-138,-41,-155,-220,-133,-120,-153,-119,-39,-42,-225,-138,-41,-155,-220,-133,-120,-153,-119,1,1,8,0,0,1,0,2,0,-2,0,84,84,84,84,84,84,84,84,84,84,84,84,13.179774589,10.529614541,11.061804618,13.047165503,12.988734261,11.741415796,12.388259309,14.684710625,15.731823862,15.63087097,12.933423662,13.788780946,14.277445495,15.134711984,16.699801193,17.066011332,19.708594355,16.41232364,16.025876645,18.636807695,0.2463509269,-3.259166406,-3.215640877,-2.087546481,-3.711066932,-5.324595536,-7.320335046,-1.727613015,-0.294052782,-3.005936725,-0.123175463,0,0,0,0,0,0,0,0,0,-5.050194001,-28.20432466,-17.75033764,-5.349337856,-20.54340623,-30.03617994,-18.72316464,-17.27613015,-22.49503786,-17.88532351,-5.173369465,-28.20432466,-17.75033764,-5.349337856,-20.54340623,-30.03617994,-18.72316464,-17.27613015,-22.49503786,-17.88532351 +050,3,7,05,097,Arkansas,Montgomery County,9487,9501,9515,9404,9344,9254,9163,9029,8947,8893,8927,9047,9006,14,-111,-60,-90,-91,-134,-82,-54,34,120,-41,26,94,67,87,89,85,91,82,89,83,86,8,132,133,114,118,147,138,151,131,125,160,18,-38,-66,-27,-29,-62,-47,-69,-42,-42,-74,0,-3,-1,5,13,11,8,2,0,-2,0,-2,-70,6,-68,-74,-83,-42,14,77,166,33,-2,-73,5,-63,-61,-72,-34,16,77,164,33,-2,0,1,0,-1,0,-1,-1,-1,-2,0,121,121,121,121,121,121,121,121,121,121,121,121,9.9371002696,7.1474290591,9.3558447145,9.6649834392,9.3447669305,10.124610592,9.1928251121,9.9887766554,9.2355624791,9.5275023542,13.95422591,14.188180073,12.259382729,12.814247706,16.160949868,15.353805073,16.928251121,14.702581369,13.908979637,17.725585775,-4.017125641,-7.040751013,-2.903538015,-3.149264267,-6.816182938,-5.229194482,-7.735426009,-4.713804714,-4.673417158,-8.198083421,-0.317141498,-0.106678046,0.537692225,1.411739154,1.2093227792,0.8900756564,0.2242152466,0,-0.222543674,0,-7.399968286,0.6400682739,-7.31261426,-8.036053646,-9.124890062,-4.672897196,1.5695067265,8.6419753086,18.471124958,3.6559020661,-7.717109784,0.5333902283,-6.774922035,-6.624314492,-7.915567282,-3.78282154,1.7937219731,8.6419753086,18.248581284,3.6559020661 +050,3,7,05,099,Arkansas,Nevada County,8997,9015,8994,9007,8909,8767,8642,8506,8368,8300,8272,8205,8099,-21,13,-98,-142,-125,-136,-138,-68,-28,-67,-106,34,115,98,136,84,111,102,102,101,75,79,33,117,117,130,124,113,116,132,111,94,114,1,-2,-19,6,-40,-2,-14,-30,-10,-19,-35,0,0,0,0,-2,-2,-4,-3,-3,-3,-3,-23,16,-80,-149,-83,-133,-119,-36,-14,-45,-67,-23,16,-80,-149,-85,-135,-123,-39,-17,-48,-70,1,-1,1,1,0,1,-1,1,-1,0,-1,157,157,157,157,157,157,157,157,157,157,157,157,12.777067941,10.939941951,15.388096854,9.6501809409,12.946116165,12.08960531,12.239020878,12.189234854,9.1035989561,9.6908734053,12.999277818,13.060951105,14.709210229,14.245505198,13.179379519,13.748962902,15.838732901,13.39608979,11.409844025,13.984298332,-0.222209877,-2.121009154,0.6788866259,-4.595324258,-0.233263354,-1.659357592,-3.599712023,-1.206854936,-2.306245069,-4.293424926,0,0,0,-0.229766213,-0.233263354,-0.474102169,-0.359971202,-0.362056481,-0.364143958,-0.368007851,1.7776790178,-8.930564858,-16.85901788,-9.535297834,-15.51201306,-14.10453953,-4.319654428,-1.68959691,-5.462159374,-8.218842002,1.7776790178,-8.930564858,-16.85901788,-9.765064047,-15.74527642,-14.5786417,-4.67962563,-2.051653391,-5.826303332,-8.586849853 +050,3,7,05,101,Arkansas,Newton County,8330,8315,8305,8252,8053,8045,7869,7848,7855,7816,7780,7712,7602,-10,-53,-199,-8,-176,-21,7,-39,-36,-68,-110,16,87,69,73,74,65,86,81,80,63,66,36,91,90,102,95,102,92,95,106,88,115,-20,-4,-21,-29,-21,-37,-6,-14,-26,-25,-49,0,0,1,0,1,1,0,-1,-1,-1,0,10,-49,-182,22,-159,16,13,-22,-8,-40,-62,10,-49,-181,22,-158,17,13,-23,-9,-41,-62,0,0,3,-1,3,-1,0,-2,-1,-2,1,51,51,51,51,51,51,51,51,51,51,51,51,10.509150208,8.4636614535,9.0694496211,9.2999874324,8.2712985939,10.953321021,10.337566205,10.25904078,8.1332300542,8.6195637978,10.992329528,11.039558418,12.672381662,11.939173055,12.979576255,11.717506209,12.124306043,13.593229033,11.360702298,15.01893692,-0.48317932,-2.575896964,-3.602932041,-2.639185623,-4.708277661,-0.764185188,-1.786739838,-3.334188253,-3.227472244,-6.399373123,0,0.1226617602,0,0.1256755058,0.1272507476,0,-0.127624274,-0.12823801,-0.12909889,0,-5.918946669,-22.32444036,2.7332587899,-19.98240543,2.0360119616,1.655734573,-2.807734031,-1.025904078,-5.16395559,-8.097165992,-5.918946669,-22.2017786,2.7332587899,-19.85672992,2.1632627092,1.655734573,-2.935358305,-1.154142088,-5.29305448,-8.097165992 +050,3,7,05,103,Arkansas,Ouachita County,26120,26128,26048,25738,25405,24957,24767,24324,24021,23820,23605,23372,23167,-80,-310,-333,-448,-190,-443,-303,-201,-215,-233,-205,54,328,312,299,303,287,271,251,260,260,257,131,360,347,388,348,341,338,355,344,320,360,-77,-32,-35,-89,-45,-54,-67,-104,-84,-60,-103,1,-1,15,10,9,4,4,2,0,1,1,-2,-278,-317,-373,-154,-395,-240,-98,-130,-174,-101,-1,-279,-302,-363,-145,-391,-236,-96,-130,-173,-100,-2,1,4,4,0,2,0,-1,-1,0,-2,352,352,352,352,352,352,352,352,352,352,352,352,12.667516317,12.201083237,11.874032008,12.187273751,11.69257094,11.211086979,10.4930917,10.964681075,11.069246653,11.044500312,13.903371568,13.569794498,15.408442874,13.997264902,13.892566866,13.98283173,14.840826906,14.5071165,13.623688188,15.470895378,-1.23585525,-1.368711261,-3.534410865,-1.809991151,-2.199995926,-2.771744751,-4.347735206,-3.542435424,-2.554441535,-4.426395067,-0.038620477,0.5865905402,0.3971248163,0.3619982302,0.1629626612,0.1654772986,0.0836102924,0,0.0425740256,0.0429747094,-10.73649249,-12.39661342,-14.81275565,-6.19419194,-16.09256279,-9.928637915,-4.096904329,-5.482340538,-7.407880452,-4.340445648,-10.77511296,-11.81002288,-14.41563083,-5.832193709,-15.92960013,-9.763160616,-4.013294036,-5.482340538,-7.365306427,-4.297470938 +050,3,7,05,105,Arkansas,Perry County,10445,10444,10445,10384,10328,10334,10358,10303,10266,10332,10366,10417,10327,1,-61,-56,6,24,-55,-37,66,34,51,-90,32,115,102,99,105,118,108,124,115,89,96,48,101,127,122,119,130,137,134,118,122,143,-16,14,-25,-23,-14,-12,-29,-10,-3,-33,-47,0,2,3,1,1,2,0,0,0,0,0,18,-77,-33,30,36,-44,-8,77,38,84,-41,18,-75,-30,31,37,-42,-8,77,38,84,-41,-1,0,-1,-2,1,-1,0,-1,-1,0,-2,152,152,152,152,152,152,152,152,152,152,152,152,11.042296798,9.8493626883,9.5828090214,10.148849797,11.422486811,10.50123973,12.040003884,11.112184752,8.5646922966,9.2556883918,9.6980171876,12.263422171,11.809118188,11.50202977,12.584095639,13.321017065,13.010971939,11.402067833,11.740364721,13.787119167,1.3442796102,-2.414059482,-2.226309167,-1.353179973,-1.161608828,-2.819777335,-0.970968055,-0.28988308,-3.175672425,-4.531430775,0.1920399443,0.2896871379,0.0967960507,0.0966557124,0.1936014714,0,0,0,0,0,-7.393537856,-3.186558517,2.9038815216,3.4796056447,-4.25923237,-0.77786961,7.4764540247,3.6718523529,8.083529808,-3.952950251,-7.201497912,-2.896871379,3.0006775724,3.576261357,-4.065630899,-0.77786961,7.4764540247,3.6718523529,8.083529808,-3.952950251 +050,3,7,05,107,Arkansas,Phillips County,21757,21755,21675,21407,20736,20435,19952,19548,19041,18607,18038,17769,17299,-80,-268,-671,-301,-483,-404,-507,-434,-569,-269,-470,66,318,301,298,315,307,293,324,263,257,247,38,277,311,269,272,253,271,250,271,257,275,28,41,-10,29,43,54,22,74,-8,0,-28,1,0,-2,1,0,0,-3,-3,-3,-3,-2,-115,-310,-682,-337,-540,-460,-529,-507,-558,-266,-437,-114,-310,-684,-336,-540,-460,-532,-510,-561,-269,-439,6,1,23,6,14,2,3,2,0,0,-3,246,246,246,246,246,246,246,246,246,246,246,246,14.762545843,14.28469734,14.476208982,15.599078912,15.544303797,15.185674674,17.212069698,14.353936417,14.354735108,14.086916847,12.859198737,14.759272002,13.06745039,13.469680838,12.810126582,14.045453368,13.280917977,14.790558057,14.354735108,15.683814304,1.9033471055,-0.474574662,1.4087585922,2.1293980736,2.7341772152,1.1402213066,3.9311517212,-0.43662164,0,-1.596897456,0,-0.094914932,0.0485778825,0,0,-0.155484724,-0.159371016,-0.163733115,-0.167565001,-0.114064104,-14.39116104,-32.36599198,-16.3707464,-26.74127813,-23.29113924,-27.4171396,-26.93370166,-30.45435939,-14.85743011,-24.92300673,-14.39116104,-32.46090691,-16.32216852,-26.74127813,-23.29113924,-27.57262432,-27.09307267,-30.61809251,-15.02499511,-25.03707083 +050,3,7,05,109,Arkansas,Pike County,11291,11286,11263,11239,11251,11117,10988,10834,10836,10731,10657,10705,10643,-23,-24,12,-134,-129,-154,2,-105,-74,48,-62,25,133,117,109,106,112,129,103,104,104,104,49,120,131,164,156,152,118,120,154,141,148,-24,13,-14,-55,-50,-40,11,-17,-50,-37,-44,2,4,1,8,3,4,4,3,0,8,8,0,-41,26,-87,-80,-119,-11,-90,-24,77,-27,2,-37,27,-79,-77,-115,-7,-87,-24,85,-19,-1,0,-1,0,-2,1,-2,-1,0,0,1,196,196,196,196,196,196,196,196,196,196,196,196,11.821171451,10.404624277,9.7460658083,9.5905903642,10.264870314,11.905860637,9.5516298048,9.7250794838,9.7369160191,9.7433014802,10.665718603,11.649622054,14.663805436,14.114453743,13.930895427,10.89063221,11.128112394,14.400598466,13.201011141,13.865467491,1.1554528486,-1.244997777,-4.917739628,-4.523863379,-3.666025112,1.0152284264,-1.576482589,-4.675518983,-3.464095122,-4.122166011,0.3555239534,0.0889284126,0.7153075823,0.2714318028,0.3666025112,0.3691739732,0.2782028098,0,0.7489935399,0.7494847292,-3.644120523,2.3121387283,-7.778969957,-7.238181407,-10.90642471,-1.015228426,-8.346084295,-2.244249112,7.2090628218,-2.529510961,-3.288596569,2.401067141,-7.063662375,-6.966749604,-10.5398222,-0.646054453,-8.067881486,-2.244249112,7.9580563618,-1.780026232 +050,3,7,05,111,Arkansas,Poinsett County,24583,24570,24510,24445,24294,24184,24151,24004,23993,24082,23877,23502,23283,-60,-65,-151,-110,-33,-147,-11,89,-205,-375,-219,59,304,312,295,310,307,343,323,312,285,278,100,332,323,356,300,365,338,360,348,332,362,-41,-28,-11,-61,10,-58,5,-37,-36,-47,-84,5,36,25,16,8,1,-1,0,0,2,2,-21,-72,-164,-63,-49,-89,-13,128,-170,-328,-139,-16,-36,-139,-47,-41,-88,-14,128,-170,-326,-137,-3,-1,-1,-2,-2,-1,-2,-2,1,-2,2,341,341,341,341,341,341,341,341,341,341,341,341,12.419568992,12.802888857,12.170469079,12.827143892,12.750493199,14.292559952,13.437337493,13.01111366,12.030646489,11.884150903,13.563476662,13.254272759,14.687074549,12.413365056,15.159381165,14.084213597,14.976599064,14.512396005,14.01464784,15.475045421,-1.14390767,-0.451383902,-2.516605471,0.4137788352,-2.408887966,0.208346355,-1.53926157,-1.501282345,-1.984001351,-3.590894517,1.4707384333,1.0258725046,0.6600932382,0.3310230682,0.0415325511,-0.041669271,0,0,0.0844255894,0.0854974885,-2.941476867,-6.72972363,-2.599117125,-2.027516293,-3.696397051,-0.541700523,5.3250130005,-7.089388853,-13.84579666,-5.942075452,-1.470738433,-5.703851125,-1.939023887,-1.696493224,-3.6548645,-0.583369794,5.3250130005,-7.089388853,-13.76137107,-5.856577963 +050,3,7,05,113,Arkansas,Polk County,20662,20654,20669,20560,20421,20344,20257,20205,20164,20163,20019,19944,19707,15,-109,-139,-77,-87,-52,-41,-1,-144,-75,-237,54,219,242,244,238,255,239,236,214,188,192,44,267,244,292,254,304,263,263,269,293,316,10,-48,-2,-48,-16,-49,-24,-27,-55,-105,-124,1,5,7,8,14,13,7,1,-1,-1,1,6,-64,-147,-33,-83,-14,-23,27,-89,31,-113,7,-59,-140,-25,-69,-1,-16,28,-90,30,-112,-2,-2,3,-4,-2,-2,-1,-2,1,0,-1,155,155,155,155,155,155,155,155,155,155,155,155,10.623590191,11.810351138,11.9710536,11.723849166,12.604418961,11.840768907,11.704317207,10.651535513,9.4087030503,9.6844972384,12.952048316,11.907957346,14.326014964,12.512007093,15.026444565,13.029800094,13.043370447,13.389079687,14.663563797,15.939068372,-2.328458124,-0.097606208,-2.354961364,-0.788157927,-2.422025604,-1.189031187,-1.33905324,-2.737544174,-5.254860746,-6.254571133,0.2425477213,0.3416217271,0.3924935607,0.6896381863,0.6425782215,0.346800763,0.0495945644,-0.04977353,-0.050046293,0.0504400898,-3.104610832,-7.17405627,-1.619035938,-4.088569247,-0.692007316,-1.139488221,1.3390532398,-4.429844209,1.5514350774,-5.699730146,-2.862063111,-6.832434543,-1.226542377,-3.398931061,-0.049429094,-0.792687458,1.3886478042,-4.479617739,1.5013887846,-5.649290056 +050,3,7,05,115,Arkansas,Pope County,61754,61754,62110,62694,62653,62612,63145,63642,63916,63657,63577,64145,64334,356,584,-41,-41,533,497,274,-259,-80,568,189,200,796,748,729,814,841,827,809,792,770,767,112,550,578,631,561,575,576,613,666,588,636,88,246,170,98,253,266,251,196,126,182,131,17,51,67,55,73,99,63,32,5,11,16,228,286,-278,-185,214,141,-38,-487,-212,375,39,245,337,-211,-130,287,240,25,-455,-207,386,55,23,1,0,-9,-7,-9,-2,0,1,0,3,3330,3539,3678,3532,3682,3812,3823,3687,3564,3271,3344,3345,12.75600141,11.934868804,11.639324632,12.945601438,13.266344341,12.966650465,12.682934477,12.449502491,12.057437247,11.939694425,8.8138200699,9.2223986214,10.074641759,8.9219685584,9.0703305544,9.0311858135,9.6101839731,10.468899822,9.2074975337,9.9004506573,3.9421813403,2.7124701828,1.5646828723,4.0236328793,4.1960137869,3.9354646514,3.0727505036,1.9806026691,2.8499397128,2.0392437675,0.8172814974,1.0690323662,0.8781383467,1.1609691707,1.5616743041,0.9877859484,0.5016735516,0.078595344,0.1722491035,0.2490679411,4.5831864363,-4.435686534,-2.953738075,3.4033890758,2.2242027968,-0.595807397,-7.634844364,-3.332442586,5.8721285291,0.6071031063,5.4004679337,-3.366654168,-2.075599729,4.5643582465,3.785877101,0.3919785509,-7.133170812,-3.253847242,6.0443776327,0.8561710474 +050,3,7,05,117,Arkansas,Prairie County,8715,8720,8726,8604,8488,8381,8355,8311,8267,8263,8100,8093,7966,6,-122,-116,-107,-26,-44,-44,-4,-163,-7,-127,32,85,86,89,104,88,81,86,91,85,86,14,105,106,99,117,105,119,102,119,111,130,18,-20,-20,-10,-13,-17,-38,-16,-28,-26,-44,0,0,0,0,0,0,-1,-1,-1,-1,0,-13,-101,-98,-100,-11,-26,-4,14,-135,21,-83,-13,-101,-98,-100,-11,-26,-5,13,-136,20,-83,1,-1,2,3,-2,-1,-1,-1,1,-1,0,131,131,131,131,131,131,131,131,131,131,131,131,9.8095787651,10.063187456,10.551899935,12.428298279,10.560422417,9.7719869707,10.405323654,11.12265477,10.49836349,10.710505013,12.117714945,12.403463609,11.737506669,13.981835564,12.60050402,14.35637592,12.341197822,14.545010084,13.709627617,16.190298275,-2.30813618,-2.340276153,-1.185606734,-1.553537285,-2.040081603,-4.584388949,-1.935874168,-3.422355314,-3.211264126,-5.479793262,0,0,0,0,0,-0.120641814,-0.120992136,-0.122226975,-0.123510159,0,-11.65608771,-11.46735315,-11.85606734,-1.314531549,-3.120124805,-0.482567258,1.6938898972,-16.50064169,2.5937133329,-10.33688274,-11.65608771,-11.46735315,-11.85606734,-1.314531549,-3.120124805,-0.603209072,1.5728977616,-16.62286867,2.4702031742,-10.33688274 +050,3,7,05,119,Arkansas,Pulaski County,382748,382752,383569,387081,389392,391745,393210,393857,394322,393585,392184,392318,392980,817,3512,2311,2353,1465,647,465,-737,-1401,134,662,1416,5751,5607,5633,5628,5640,5326,5226,5229,5123,5010,836,3358,3374,3732,3451,3629,3589,3761,3834,3840,4104,580,2393,2233,1901,2177,2011,1737,1465,1395,1283,906,197,755,975,738,883,894,740,460,149,357,309,63,369,-814,-236,-1529,-2233,-2002,-2653,-2945,-1508,-578,260,1124,161,502,-646,-1339,-1262,-2193,-2796,-1151,-269,-23,-5,-83,-50,-66,-25,-10,-9,0,2,25,7980,7973,8433,8447,8635,8586,8966,9170,8838,8708,8672,8613,14.925063258,14.442227869,14.42256608,14.339675523,14.331689678,13.514696535,13.265524992,13.30925501,13.060514823,12.759487481,8.7147213391,8.6905790671,9.5553020789,8.7928607372,9.2215783409,9.1070683182,9.5468119968,9.7585931743,9.7896499945,10.452083158,6.2103419192,5.7516488017,4.8672640011,5.5468147856,5.1101113374,4.4076282164,3.7187129953,3.5506618357,3.2708648289,2.3074043229,1.9593849348,2.5113558359,1.889553305,2.2498104987,2.2717252788,1.877746045,1.1676504968,0.3792463179,0.9101315229,0.7869624015,0.9576331668,-2.096660154,-0.604247398,-3.895764725,-5.674231038,-5.0800643,-6.734297322,-7.495841653,-3.844477133,-1.472052648,2.9170181016,0.4146956816,1.2853059066,-1.645954227,-3.402505759,-3.202318255,-5.566646825,-7.116595335,-2.93434561,-0.685090246 +050,3,7,05,121,Arkansas,Randolph County,17969,17969,17955,17972,17840,17628,17579,17447,17452,17724,18085,18161,18247,-14,17,-132,-212,-49,-132,5,272,361,76,86,55,224,213,198,198,192,203,248,262,258,269,77,230,236,229,232,239,255,238,282,233,272,-22,-6,-23,-31,-34,-47,-52,10,-20,25,-3,3,-3,-7,-8,-5,-2,7,34,23,24,17,5,28,-101,-173,-10,-82,51,228,359,26,73,8,25,-108,-181,-15,-84,58,262,382,50,90,0,-2,-1,0,0,-1,-1,0,-1,1,-1,349,349,349,349,349,349,349,349,349,349,349,349,12.469730286,11.895454038,11.164993797,11.247763229,10.963284417,11.633571162,14.100523084,14.633192773,14.236053634,14.776972094,12.803740919,13.179939685,12.913048382,13.179197319,13.647005082,14.613599244,13.531953605,15.750230389,12.856591072,14.941771039,-0.334010633,-1.284485647,-1.748054584,-1.93143409,-2.683720665,-2.980028081,0.5685694792,-1.117037616,1.3794625614,-0.164798945,-0.167005316,-0.390930414,-0.45111086,-0.284034425,-0.114200879,0.4011576263,1.9331362292,1.2845932587,1.3242840589,0.93386069,1.5587162858,-5.640567408,-9.755272358,-0.56806885,-4.682236053,2.9227198487,12.963384126,20.050825212,1.4346410638,4.0101076686,1.3917109695,-6.031497822,-10.20638322,-0.852103275,-4.796436933,3.323877475,14.896520355,21.33541847,2.7589251228,4.9439683586 +050,3,7,05,123,Arkansas,St. Francis County,28258,28246,28131,27934,27927,27442,27029,26600,26306,25959,25459,24977,24682,-115,-197,-7,-485,-413,-429,-294,-347,-500,-482,-295,94,352,366,328,355,356,348,338,304,306,287,91,287,272,306,285,277,259,281,287,285,334,3,65,94,22,70,79,89,57,17,21,-47,3,23,46,22,25,30,23,23,9,19,17,-126,-288,-147,-538,-517,-544,-408,-429,-525,-522,-265,-123,-265,-101,-516,-492,-514,-385,-406,-516,-503,-248,5,3,0,9,9,6,2,2,-1,0,0,4085,4086,4086,4089,4091,4086,4091,4096,4100,4099,4096,4095,12.556853652,13.103954458,11.847784862,13.034458703,13.276398963,13.155407704,12.934085908,11.824652845,12.134189864,11.558831229,10.238116472,9.7384579581,11.053116365,10.464283747,10.330231778,9.7909499868,10.752893906,11.163405811,11.301451344,13.451740873,2.3187371801,3.3654965002,0.7946684968,2.5701749555,2.9461671857,3.3644577175,2.1811920023,0.6612470341,0.8327385201,-1.892909644,0.8204762329,1.6469450959,0.7946684968,0.917919627,1.1187976654,0.8694666011,0.8801301062,0.3500719592,0.7534300896,0.6846694456,-10.27378935,-5.263063676,-19.43325688,-18.98257789,-20.287531,-15.42358145,-16.41633981,-20.42086429,-20.69950036,-10.67278842,-9.453313119,-3.61611858,-18.63858838,-18.06465826,-19.16873333,-14.55411485,-15.5362097,-20.07079233,-19.94607027,-9.988118971 +050,3,7,05,125,Arkansas,Saline County,107118,107126,107651,109554,111454,113380,114906,116428,117707,119578,121147,122550,123968,525,1903,1900,1926,1526,1522,1279,1871,1569,1403,1418,287,1299,1321,1413,1346,1380,1363,1263,1321,1352,1339,249,907,908,1026,1076,1115,1082,1138,1212,1149,1201,38,392,413,387,270,265,281,125,109,203,138,17,69,113,46,78,48,39,33,-1,52,40,441,1435,1345,1473,1168,1206,959,1711,1461,1153,1243,458,1504,1458,1519,1246,1254,998,1744,1460,1205,1283,29,7,29,20,10,3,0,2,0,-5,-3,1425,1448,1423,1417,1376,1393,1420,1430,1435,1422,1413,1407,11.96105062,11.954318396,12.569273331,11.792225542,11.930801352,11.642855617,10.645426386,10.975179146,11.095745947,10.863304099,8.3515572846,8.2168971259,9.1267335012,9.4267716811,9.6397416722,9.2425310184,9.591841035,10.069581473,9.4297426723,9.7437103984,3.6094933358,3.7374212698,3.4425398294,2.3654538605,2.2910596799,2.4003245991,1.0535853509,0.9055976737,1.6660032746,1.1195937011,0.6353444902,1.0225874177,0.4091907808,0.6833533375,0.4149843949,0.3331411365,0.2781465327,-0.008308236,0.4267594595,0.3245199134,13.213323819,12.171505104,13.103000436,10.232778182,10.426482921,8.1918551263,14.421476284,12.138332122,9.462570323,10.084456307,13.848668309,13.194092522,13.512191217,10.916131519,10.841467316,8.5249962628,14.699622816,12.130023886,9.8893297825,10.408976221 +050,3,7,05,127,Arkansas,Scott County,11233,11217,11251,11241,11007,10908,10663,10538,10318,10360,10288,10217,10164,34,-10,-234,-99,-245,-125,-220,42,-72,-71,-53,35,143,149,109,111,132,121,119,117,126,114,42,131,123,127,117,112,136,148,127,113,129,-7,12,26,-18,-6,20,-15,-29,-10,13,-15,3,5,-3,-3,-3,-4,1,-1,-1,-1,0,35,-25,-266,-79,-240,-143,-205,73,-62,-83,-38,38,-20,-269,-82,-243,-147,-204,72,-63,-84,-38,3,-2,9,1,4,2,-1,-1,1,0,0,79,79,79,79,79,79,79,79,79,79,79,79,12.715632225,13.394462424,9.9475245266,10.291595197,12.452242819,11.603375527,11.509817197,11.332816738,12.289685443,11.18688975,11.648586164,11.057173679,11.590234999,10.84789764,10.565539361,13.04181051,14.314730632,12.301433553,11.021702024,12.658848928,1.0670460608,2.3372887451,-1.642710472,-0.556302443,1.8867034574,-1.438434983,-2.804913435,-0.968616815,1.2679834187,-1.471959178,0.4446025253,-0.269687163,-0.273785079,-0.278151222,-0.377340691,0.0958956655,-0.096721153,-0.096861682,-0.097537186,0,-2.223012627,-23.91226178,-7.209673739,-22.25209772,-13.48992972,-19.65861143,7.0606441629,-6.005424254,-8.095586442,-3.72896325,-1.778410101,-24.18194894,-7.483458818,-22.53024895,-13.86727041,-19.56271577,6.96392301,-6.102285936,-8.193123628,-3.72896325 +050,3,7,05,129,Arkansas,Searcy County,8195,8195,8182,8077,8005,7992,7926,7838,7960,7928,7898,7862,7842,-13,-105,-72,-13,-66,-88,122,-32,-30,-36,-20,14,77,76,81,74,79,75,87,81,68,68,32,104,119,109,125,121,118,122,123,100,121,-18,-27,-43,-28,-51,-42,-43,-35,-42,-32,-53,0,2,5,0,4,3,5,3,1,4,2,6,-81,-32,15,-18,-48,161,0,12,-6,31,6,-79,-27,15,-14,-45,166,3,13,-2,33,-1,1,-2,0,-1,-1,-1,0,-1,-2,0,71,71,71,71,71,71,71,71,71,71,71,71,9.4716772249,9.4515607512,10.126898794,9.2976504586,10.022836843,9.4948727687,10.951661631,10.23631998,8.6294416244,8.6602139582,12.792914693,14.799154334,13.627555167,15.70549064,15.351433646,14.938599823,15.357502518,15.544041451,12.69035533,15.410086602,-3.321237468,-5.347593583,-3.500656373,-6.407840181,-5.328596803,-5.443727054,-4.405840886,-5.307721471,-4.060913706,-6.749872644,0.2460175903,0.6218132073,0,0.5025757005,0.3806140573,0.6329915179,0.3776435045,0.1263743207,0.5076142132,0.2547121752,-9.963712405,-3.979604527,1.8753516284,-2.261590652,-6.089824918,20.382326877,0,1.5164918489,-0.76142132,3.9480387163,-9.717694815,-3.357791319,1.8753516284,-1.759014952,-5.70921086,21.015318395,0.3776435045,1.6428661696,-0.253807107,4.2027508915 +050,3,7,05,131,Arkansas,Sebastian County,125744,125768,125782,127067,127645,127266,126852,127511,127578,127910,127582,127688,127590,14,1285,578,-379,-414,659,67,332,-328,106,-98,418,1761,1757,1629,1699,1679,1723,1735,1660,1661,1615,304,1187,1221,1260,1265,1255,1291,1287,1365,1286,1383,114,574,536,369,434,424,432,448,295,375,232,41,235,202,76,95,119,108,11,-35,-28,-11,-134,478,-133,-827,-945,131,-470,-122,-585,-245,-324,-93,713,69,-751,-850,250,-362,-111,-620,-273,-335,-7,-2,-27,3,2,-15,-3,-5,-3,4,5,2235,2235,2310,2414,2407,2397,2381,2301,2276,2242,2198,2185,13.929262129,13.795973492,12.780931384,13.371740687,13.201605579,13.509010581,13.581851202,12.994536032,13.013671798,12.652872555,9.3890029227,9.5872985961,9.8858032804,9.9560046907,9.8677873747,10.121957434,10.074837174,10.685266075,10.075606221,10.835246281,4.5402592061,4.2086748956,2.8951281035,3.4157359967,3.3338182047,3.3870531462,3.5070140281,2.3092699576,2.9380655776,1.8176262741,1.8588169224,1.5861050912,0.5962865471,0.7476841467,0.9356706754,0.8467632865,0.0861097194,-0.273981181,-0.219375563,-0.086180556,3.7809127187,-1.044316718,-6.488539137,-7.43748967,1.0300240208,-3.684988377,-0.95503507,-4.579399746,-1.919536177,-2.538409107,5.639729641,0.5417883728,-5.89225259,-6.689805523,1.9656946962,-2.83822509,-0.868925351,-4.853380928,-2.138911741,-2.624589663 +050,3,7,05,133,Arkansas,Sevier County,17058,17061,17153,17219,17186,17358,17411,17263,16959,17085,17019,16972,16702,92,66,-33,172,53,-148,-304,126,-66,-47,-270,73,276,284,282,287,236,262,269,243,239,233,21,171,161,169,148,163,156,181,156,139,166,52,105,123,113,139,73,106,88,87,100,67,13,59,-8,12,-9,-5,-25,-25,-33,-18,-12,28,-97,-149,49,-77,-217,-385,64,-121,-129,-323,41,-38,-157,61,-86,-222,-410,39,-154,-147,-335,-1,-1,1,-2,0,1,0,-1,1,0,-2,173,173,173,173,173,173,173,173,173,173,173,173,16.059583382,16.50922831,16.327003242,16.50895913,13.612505047,15.311787739,15.803078369,14.250527797,14.062545968,13.838569816,9.9499592692,9.3591047813,9.7846225104,8.5133308407,9.4018572994,9.1169423178,10.633298085,9.148486981,8.1786355212,9.8592385817,6.1096241126,7.1501235286,6.5423807318,7.9956282896,4.2106477476,6.1948454211,5.1697802843,5.1020408163,5.8839104469,3.9793312348,3.4330268823,-0.465048685,0.6947660954,-0.517702551,-0.288400531,-1.461048448,-1.468687581,-1.935256861,-1.05910388,-0.712716042,-5.644128942,-8.661531754,2.8369615563,-4.429232937,-12.51658303,-22.5001461,3.7598402068,-7.095941825,-7.590244476,-19.18394013,-2.21110206,-9.126580439,3.5317276517,-4.946935489,-12.80498356,-23.96119455,2.291152626,-9.031198686,-8.649348357,-19.89665617 +050,3,7,05,135,Arkansas,Sharp County,17264,17258,17244,17264,17032,17041,16821,16811,17016,17146,17222,17276,17424,-14,20,-232,9,-220,-10,205,130,76,54,148,39,173,180,168,161,174,202,174,184,183,176,44,274,270,249,247,284,271,278,293,262,250,-5,-101,-90,-81,-86,-110,-69,-104,-109,-79,-74,0,4,9,3,6,8,2,3,2,3,3,-8,118,-152,86,-138,93,272,230,182,131,223,-8,122,-143,89,-132,101,274,233,184,134,226,-1,-1,1,1,-2,-1,0,1,1,-1,-4,189,189,189,189,189,189,189,189,189,189,189,189,10.026660485,10.496850945,9.8611804068,9.5091843364,10.347288297,11.943122358,10.186757216,10.707635009,10.609310685,10.144092219,15.880375565,15.745276417,14.615678103,14.588624417,16.88867745,16.022703757,16.275393712,17.050744879,15.189286335,14.409221902,-5.853715081,-5.248425472,-4.754497696,-5.07944008,-6.541389153,-4.079581399,-6.088636497,-6.34310987,-4.579975651,-4.265129683,0.2318303002,0.5248425472,0.1760925073,0.3543795405,0.475737393,0.1182487362,0.1756337451,0.1163873371,0.173923126,0.1729106628,6.8389938565,-8.864007464,5.0479852082,-8.150729431,5.5304471931,16.081828125,13.465253791,10.591247672,7.5946431677,12.853025937,7.0708241567,-8.339164917,5.2240777155,-7.796349891,6.0061845861,16.200076862,13.640887536,10.707635009,7.7685662937,13.025936599 +050,3,7,05,137,Arkansas,Stone County,12394,12396,12391,12505,12552,12434,12392,12405,12525,12555,12542,12614,12674,-5,114,47,-118,-42,13,120,30,-13,72,60,20,128,132,123,110,140,113,120,141,125,135,50,172,172,174,162,179,163,176,171,180,184,-30,-44,-40,-51,-52,-39,-50,-56,-30,-55,-49,1,-3,-6,-7,-8,-3,-1,-1,-1,-1,-1,25,158,93,-59,20,57,171,87,19,129,111,26,155,87,-66,12,54,170,86,18,128,110,-1,3,0,-1,-2,-2,0,0,-1,-1,-1,151,151,151,151,151,151,151,151,151,151,151,151,10.28277635,10.53597797,9.8455134876,8.8616772738,11.291688511,9.0653830726,9.5693779904,11.236402757,9.9379869614,10.677000949,13.81748072,13.728698567,13.927799568,13.050833803,14.43723031,13.076614521,14.035087719,13.627126748,14.310701224,14.552356849,-3.53470437,-3.192720597,-4.08228608,-4.189156529,-3.145541799,-4.011231448,-4.465709729,-2.390723991,-4.372714263,-3.8753559,-0.241002571,-0.47890809,-0.560313776,-0.64448562,-0.241964754,-0.080224629,-0.079744817,-0.0796908,-0.079503896,-0.079088896,12.692802057,7.4230753881,-4.722644681,1.6112140498,4.5973303222,13.718411552,6.9377990431,1.5141251942,10.256002544,8.778867447,12.451799486,6.9441672986,-5.282958457,0.9667284299,4.3553655684,13.638186923,6.8580542265,1.4344343945,10.176498648,8.6997785511 +050,3,7,05,139,Arkansas,Union County,41639,41634,41570,41404,40868,40619,40156,40112,39920,39499,39130,38677,38219,-64,-166,-536,-249,-463,-44,-192,-421,-369,-453,-458,112,526,529,486,524,546,564,523,460,442,434,81,583,478,514,573,519,511,518,584,540,573,31,-57,51,-28,-49,27,53,5,-124,-98,-139,6,14,-11,-3,-11,3,8,16,6,10,7,-103,-122,-593,-217,-411,-71,-252,-444,-252,-365,-325,-97,-108,-604,-220,-422,-68,-244,-428,-246,-355,-318,2,-1,17,-1,8,-3,-1,2,1,0,-1,524,524,524,524,524,524,524,524,524,524,524,524,12.678670427,12.859782186,11.928283039,12.974311359,13.604425176,14.094362255,13.170651859,11.700517621,11.361445628,11.287973367,14.052594789,11.619992221,12.615509222,14.187558032,12.931678876,12.769892043,13.044737405,14.854570197,13.880499184,14.903245943,-1.373924362,1.239789965,-0.687226183,-1.213246673,0.6727462999,1.3244702119,0.1259144537,-3.154052576,-2.519053556,-3.615272576,0.3374551064,-0.267405679,-0.073631377,-0.272361498,0.0747495889,0.199920032,0.4029262519,0.1526154472,0.2570462812,0.1820640866,-2.940680213,-14.41559704,-5.326002921,-10.17641597,-1.769073603,-6.297481008,-11.18120349,-6.409848784,-9.382189263,-8.452975447,-2.603225107,-14.68300272,-5.399634297,-10.44877747,-1.694324015,-6.097560976,-10.77827724,-6.257233336,-9.125142982,-8.270911361 +050,3,7,05,141,Arkansas,Van Buren County,17295,17294,17306,17212,17166,16988,16911,16811,16682,16557,16580,16529,16541,12,-94,-46,-178,-77,-100,-129,-125,23,-51,12,40,197,189,147,173,157,165,132,148,143,145,39,201,221,239,240,223,240,251,269,213,262,1,-4,-32,-92,-67,-66,-75,-119,-121,-70,-117,0,-1,-4,0,3,15,17,16,10,14,10,13,-89,-6,-81,-11,-48,-70,-21,135,6,120,13,-90,-10,-81,-8,-33,-53,-5,145,20,130,-2,0,-4,-5,-2,-1,-1,-1,-1,-1,-1,189,189,189,189,189,189,189,189,189,189,189,189,11.41433455,10.995404037,8.608069333,10.206790761,9.3114287409,9.8528050637,7.9424772105,8.9326130911,8.6381346462,8.7692772906,11.646097688,12.857059748,13.995432453,14.159709726,13.22578732,14.33135282,15.102740756,16.235627848,12.866592165,15.845176897,-0.231763138,-1.86165571,-5.38736312,-3.952918965,-3.914358579,-4.478547756,-7.160263546,-7.303014757,-4.228457519,-7.075899607,-0.057940785,-0.232706964,0,0.1769963716,0.8896269498,1.0151374914,0.9627245104,0.6035549386,0.8456915038,0.6047777442,-5.156729822,-0.349060446,-4.743221877,-0.648986696,-2.846806239,-4.179977906,-1.26357592,8.1479916709,0.3624392159,7.2573329301,-5.214670607,-0.581767409,-4.743221877,-0.471990324,-1.957179289,-3.164840414,-0.300851409,8.7515466095,1.2081307197,7.8621106743 +050,3,7,05,143,Arkansas,Washington County,203065,203045,204021,208088,211824,216107,220075,224600,228612,232915,236855,239392,243216,976,4067,3736,4283,3968,4525,4012,4303,3940,2537,3824,802,3200,3317,3235,3211,3150,3202,3161,3241,3194,3220,327,1323,1415,1437,1418,1528,1567,1644,1637,1633,1761,475,1877,1902,1798,1793,1622,1635,1517,1604,1561,1459,179,913,696,292,547,682,868,612,383,378,324,321,1269,1128,2154,1592,2199,1502,2158,1938,589,2028,500,2182,1824,2446,2139,2881,2370,2770,2321,967,2352,1,8,10,39,36,22,7,16,15,9,13,7563,7564,7789,7809,7821,8183,8301,8124,8258,8243,8009,7996,15.529871951,15.798548267,15.119259881,14.72321187,14.167650531,14.130252509,13.698006834,13.798241693,13.413207852,13.344163379,6.4206314349,6.7395073253,6.7160359965,6.5018730713,6.8724349244,6.9150860966,7.1241769171,6.9693679886,6.8577859808,7.2978483573,9.1092405165,9.0590409419,8.4032238842,8.2213387989,7.2952156069,7.2151664122,6.5738299168,6.8288737042,6.5554218714,6.0463150217,4.4308665911,3.3149802816,1.3647059923,2.5081273413,3.0674087817,3.8304369699,2.6520658596,1.63058518,1.5874115742,1.3427046381,6.1585648457,5.3725542495,10.067043519,7.2997051689,9.8903693709,6.6282446184,9.3515655639,8.2508461588,2.4735063948,8.4043364387,10.589431437,8.687534531,11.431749511,9.8078325103,12.957778153,10.458681588,12.003631424,9.8814313387,4.060917969,9.7470410768 +050,3,7,05,145,Arkansas,White County,77076,77075,77349,78087,78659,78590,78500,78954,78941,78944,78390,78621,78729,274,738,572,-69,-90,454,-13,3,-554,231,108,244,936,986,1036,997,1049,897,947,910,896,880,135,803,823,807,851,817,832,864,877,856,899,109,133,163,229,146,232,65,83,33,40,-19,13,100,80,62,66,40,42,37,3,12,12,148,505,332,-364,-298,193,-119,-115,-590,179,111,161,605,412,-302,-232,233,-77,-78,-587,191,123,4,0,-3,4,-4,-11,-1,-2,0,0,4,3252,3235,3352,3454,3535,3535,3574,3468,3330,3173,3032,3033,12.043542037,12.580863308,13.176554382,12.693360494,13.324526528,11.361981063,11.996073091,11.567747594,11.413213087,11.185255799,10.332226769,10.501065418,10.263976242,10.834553441,10.377634103,10.538649102,10.944674922,11.148257846,10.903694646,11.42675564,1.711315268,2.0797978896,2.9125781404,1.8588070533,2.9468924257,0.8233319611,1.0513981696,0.4194897479,0.5095184414,-0.241499841,1.286703209,1.0207597004,0.7885582738,0.8402826405,0.508084901,0.5319991133,0.4686955696,0.0381354316,0.1528555324,0.1525262154,6.4978512056,4.2361527567,-4.629600188,-3.794003438,2.4515096473,-1.507330821,-1.4567565,-7.49996822,2.2800950252,1.4108674929,7.7845544147,5.2569124571,-3.841041914,-2.953720797,2.9595945482,-0.975331708,-0.98806093,-7.461832789,2.4329505576,1.5633937083 +050,3,7,05,147,Arkansas,Woodruff County,7260,7264,7248,7175,7063,7029,6869,6715,6616,6580,6496,6431,6264,-16,-73,-112,-34,-160,-154,-99,-36,-84,-65,-167,15,80,87,84,77,52,77,80,80,99,91,24,106,99,96,100,108,104,106,103,86,105,-9,-26,-12,-12,-23,-56,-27,-26,-23,13,-14,0,0,0,0,0,0,0,0,0,0,0,-7,-47,-104,-21,-141,-97,-73,-9,-60,-79,-152,-7,-47,-104,-21,-141,-97,-73,-9,-60,-79,-152,0,0,4,-1,4,-1,1,-1,-1,1,-1,106,106,106,106,106,106,106,106,106,106,106,106,11.093392498,12.220817531,11.921657678,11.08073104,7.65606596,11.552021604,12.124886329,12.236157846,15.316778835,14.336352895,14.69874506,13.906447535,13.624751632,14.390559793,15.901060071,15.602730478,16.065474386,15.754053227,13.305484645,16.541945648,-3.605352562,-1.685630004,-1.703093954,-3.309828752,-8.244994111,-4.050708874,-3.940588057,-3.517895381,2.0112941905,-2.205592753,0,0,0,0,0,0,0,0,0,0,-6.517368093,-14.60879337,-2.98041442,-20.29068931,-14.28150766,-10.95191659,-1.364049712,-9.177118385,-12.22248008,-23.9464356,-6.517368093,-14.60879337,-2.98041442,-20.29068931,-14.28150766,-10.95191659,-1.364049712,-9.177118385,-12.22248008,-23.9464356 +050,3,7,05,149,Arkansas,Yell County,22185,22185,22148,21965,21827,21823,21771,21505,21520,21544,21506,21376,21181,-37,-183,-138,-4,-52,-266,15,24,-38,-130,-195,78,316,281,297,253,271,297,273,255,249,250,87,214,269,264,235,272,266,279,268,257,252,-9,102,12,33,18,-1,31,-6,-13,-8,-2,14,60,6,25,14,16,25,52,75,2,22,-43,-346,-154,-59,-82,-283,-41,-20,-99,-123,-214,-29,-286,-148,-34,-68,-267,-16,32,-24,-121,-192,1,1,-2,-3,-2,2,0,-2,-1,-1,-1,323,323,323,323,323,323,323,323,323,323,323,323,14.326842427,12.833394227,13.608247423,11.607101895,12.524262871,13.805926787,12.678803641,11.846689895,11.613264307,11.748948469,9.7023553148,12.285348922,12.096219931,10.781300179,12.570477863,12.364904126,12.957458666,12.450638792,11.986381232,11.842940057,4.6244871126,0.5480453051,1.5120274914,0.8258017158,-0.046214992,1.4410226612,-0.278655025,-0.603948897,-0.373116926,-0.093991588,2.7202865368,0.2740226525,1.1454753723,0.6422902234,0.7394398743,1.1621150494,2.4150102174,3.4843205575,0.0932792314,1.0339074653,-15.6869857,-7.033248082,-2.703321879,-3.761985594,-13.07884278,-1.905868681,-0.928850084,-4.599303136,-5.73667273,-10.05709989,-12.96669916,-6.759225429,-1.557846506,-3.119695371,-12.3394029,-0.743753632,1.4861601338,-1.114982578,-5.643393498,-9.023192424 +040,4,9,06,000,California,California,37253956,37254522,37319550,37636311,37944551,38253768,38586706,38904296,39149186,39337785,39437463,39437610,39368078,65028,316761,308240,309217,332938,317590,244890,188599,99678,147,-69532,123328,509748,497428,499632,498931,500368,489146,482694,462012,452438,448160,57317,238381,239541,247702,244044,253789,260115,265216,270180,277722,304961,66011,271367,257887,251930,254887,246579,229031,217478,191832,174716,143199,19063,96569,95561,113526,127975,153571,138763,109976,68369,33553,28803,-19639,-50732,-41300,-53388,-46407,-80121,-122220,-138211,-160192,-208407,-242313,-576,45837,54261,60138,81568,73450,16543,-28235,-91823,-174854,-213510,-407,-443,-3908,-2851,-3517,-2439,-684,-644,-331,285,779,820359,819625,817661,818824,809930,820099,822600,815744,821241,828817,827900,829974,13.601284628,13.162803039,13.113990087,12.986151022,12.914221963,12.533611249,12.299977789,11.729877385,11.472268305,11.373798297,6.3605699893,6.3386681142,6.5015082551,6.3519649814,6.5501540424,6.6650453852,6.7582172333,6.8595150599,7.0420727218,7.7395682403,7.2407146387,6.8241349245,6.6124818318,6.6341860411,6.3640679211,5.8685658636,5.5417605554,4.870362325,4.4301955828,3.6342300571,2.5766897668,2.528708921,2.9797507738,3.3309268759,3.9635827654,3.5555876931,2.802401433,1.7357990419,0.850788436,0.7309878444,-1.353649983,-1.09286925,-1.401290756,-1.207879066,-2.067878797,-3.131698852,-3.521883906,-4.067064314,-5.284483223,-6.149632245,1.2230397834,1.4358396706,1.5784600183,2.1230478094,1.8957039683,0.4238888407,-0.719482473,-2.331265273,-4.433694787,-5.4186444 +050,4,9,06,001,California,Alameda County,1510271,1510283,1512997,1530893,1553729,1579508,1607638,1634326,1650765,1659824,1666596,1668412,1662323,2714,17896,22836,25779,28130,26688,16439,9059,6772,1816,-6089,4876,19222,18978,19471,19494,19494,19582,19497,18337,18329,18186,2152,9075,9204,9628,9252,9604,9566,9971,9909,10526,11948,2724,10147,9774,9843,10242,9890,10016,9526,8428,7803,6238,1678,9005,9063,10138,11475,13960,12664,11302,8351,5545,4436,-1591,-1223,4028,5720,6290,2857,-6168,-11720,-9958,-11531,-16777,87,7782,13091,15858,17765,16817,6496,-418,-1607,-5986,-12341,-97,-33,-29,78,123,-19,-73,-49,-49,-1,14,37442,37449,37381,36524,36528,37076,36746,36398,36436,36400,36969,36710,12.629891356,12.304911266,12.428679988,12.232887982,12.026043472,11.921739763,11.778568708,11.025065987,10.991877681,10.920112227,5.9627647517,5.9676679995,6.1457208631,5.8058212583,5.9248036067,5.8238873748,6.0237015226,5.9577563867,6.3124286359,7.1743924389,6.6671266044,6.3372432668,6.282959125,6.4270667236,6.1012398657,6.0978523883,5.7548671853,5.0673096001,4.6794490448,3.7457197886,5.916770974,5.8762467492,6.4712627867,7.2007997123,8.6120635516,7.7099842896,6.8277880462,5.0210135822,3.3253293545,2.6636763357,-0.803577002,2.6116652219,3.651176084,3.9471050275,1.7625118601,-3.755147118,-7.080311087,-5.987217489,-6.915125841,-10.07405272,5.1131939722,8.4879119711,10.122438871,11.14790474,10.374575412,3.9548371719,-0.25252304,-0.966203907,-3.589796486,-7.410376388 +050,4,9,06,003,California,Alpine County,1175,1175,1161,1093,1111,1131,1083,1080,1053,1116,1081,1113,1119,-14,-68,18,20,-48,-3,-27,63,-35,32,6,2,5,5,7,6,4,6,6,9,8,10,4,8,6,7,9,12,8,10,15,17,13,-2,-3,-1,0,-3,-8,-2,-4,-6,-9,-3,0,0,1,2,1,2,2,2,1,0,0,-13,-65,17,17,-46,1,-26,66,-31,42,8,-13,-65,18,19,-45,3,-24,68,-30,42,8,1,0,1,1,0,2,-1,-1,1,-1,1,24,24,24,24,24,24,24,24,24,24,24,24,4.4365572316,4.5372050817,6.2444246209,5.4200542005,3.6985668054,5.6258790436,5.5325034578,8.1929904415,7.2926162261,8.9605734767,7.0984915705,5.444646098,6.2444246209,8.1300813008,11.095700416,7.5011720581,9.2208390964,13.654984069,15.49680948,11.64874552,-2.661934339,-0.907441016,0,-2.7100271,-7.397133611,-1.875293015,-3.688335639,-5.461993628,-8.204193254,-2.688172043,0,0.9074410163,1.7841213202,0.9033423668,1.8492834027,1.8752930145,1.8441678193,0.9103322713,0,0,-57.67524401,15.426497278,15.165031222,-41.55374887,0.9246417013,-24.37880919,60.857538036,-28.22030041,38.286235187,7.1684587814,-57.67524401,16.333938294,16.949152542,-40.6504065,2.773925104,-22.50351617,62.701705855,-27.30996814,38.286235187,7.1684587814 +050,4,9,06,005,California,Amador County,38091,38091,37883,37539,37105,36624,36734,37039,37443,38549,39349,39693,40083,-208,-344,-434,-481,110,305,404,1106,800,344,390,77,264,278,253,288,303,308,297,309,309,314,84,441,426,419,425,439,450,444,437,444,494,-7,-177,-148,-166,-137,-136,-142,-147,-128,-135,-180,1,13,5,22,28,37,29,27,17,14,11,-219,-179,-297,-345,218,404,516,1212,906,468,564,-218,-166,-292,-323,246,441,545,1239,923,482,575,17,-1,6,8,1,0,1,14,5,-3,-5,4551,4370,4191,3874,3295,3283,3283,3239,3977,4409,4369,4390,7.0006099016,7.4486897808,6.8629711511,7.8519043594,8.2143873775,8.2704546065,7.816612275,7.9334514365,7.8186280712,7.8720417168,11.694200631,11.414179304,11.36594827,11.587011642,11.901373131,12.083456406,11.685440573,11.219800252,11.234533539,12.384677096,-4.693590729,-3.965489524,-4.502977119,-3.735107282,-3.686985754,-3.813001799,-3.868828298,-3.286348815,-3.415905468,-4.512635379,0.3447270027,0.1339692407,0.5967801001,0.7633795905,1.0030770065,0.778711635,0.7106011159,0.436468202,0.3542420485,0.2757721621,-4.746625653,-7.957772895,-9.358597024,5.9434553832,10.952516503,13.855696678,31.898094536,23.261187707,11.841805622,14.139590854,-4.40189865,-7.823803655,-8.761816924,6.7068349737,11.95559351,14.634408313,32.608695652,23.697655909,12.196047671,14.415363016 +050,4,9,06,007,California,Butte County,220000,220005,219951,219983,220877,221649,223525,224643,226222,228700,230330,218726,212744,-54,32,894,772,1876,1118,1579,2478,1630,-11604,-5982,623,2444,2401,2319,2505,2477,2448,2463,2412,2290,2236,516,2181,2247,2304,2171,2327,2400,2495,2521,2372,2371,107,263,154,15,334,150,48,-32,-109,-82,-135,40,79,137,219,316,257,218,166,89,32,20,-183,-301,629,556,1233,731,1316,2336,1650,-11525,-5850,-143,-222,766,775,1549,988,1534,2502,1739,-11493,-5830,-18,-9,-26,-18,-7,-20,-3,8,0,-29,-17,4942,4902,4858,5275,5326,5325,5421,5397,5426,5458,5334,5443,11.110757523,10.892346777,10.480740115,11.254026515,11.053890505,10.859126346,10.828229894,10.509117051,10.199173377,10.364567641,9.9151236322,10.19371229,10.412947488,9.7534896467,10.38449867,10.6462023,10.968913352,10.984031545,10.564383952,10.990335365,1.1956338905,0.6986344871,0.0677926269,1.5005368687,0.6693918352,0.212924046,-0.140683458,-0.474914494,-0.365210575,-0.625767724,0.3591447808,0.6215124983,0.9897723524,1.4196696123,1.1468913443,0.9670300423,0.7297954375,0.3877742195,0.1425212,0.0927063295,-1.368387076,2.8535135871,2.5128467028,5.5394070633,3.2621695436,5.8376675945,10.269892421,7.1890726096,-51.32990095,-27.11660139,-1.009242295,3.4750260854,3.5026190552,6.9590766756,4.4090608879,6.8046976368,10.999687859,7.5768468292,-51.18737975,-27.02389506 +050,4,9,06,009,California,Calaveras County,45578,45577,45467,45159,44816,44658,44677,44972,45307,45658,45747,46119,46308,-110,-308,-343,-158,19,295,335,351,89,372,189,74,333,354,325,365,356,366,402,406,391,390,141,453,451,510,469,467,521,517,500,519,569,-67,-120,-97,-185,-104,-111,-155,-115,-94,-128,-179,3,13,8,23,31,41,25,12,6,3,3,-39,-200,-252,13,95,364,464,453,179,501,369,-36,-187,-244,36,126,405,489,465,185,504,372,-7,-1,-2,-9,-3,1,1,1,-2,-4,-4,493,493,493,493,493,494,491,493,493,493,493,493,7.3488844261,7.868852459,7.2646802423,8.1714893379,7.9420852436,8.1081979198,8.838564283,8.8835402877,8.5123984935,8.439092473,9.9971310661,10.025006946,11.399959765,10.499804108,10.418409575,11.541997585,11.367009289,10.940320551,11.299066031,12.312419531,-2.64824664,-2.156154487,-4.135279523,-2.32831477,-2.476324332,-3.433799665,-2.528445006,-2.056780264,-2.786667538,-3.873327058,0.286893386,0.1778271742,0.5141158325,0.6940169027,0.9146783567,0.5538386557,0.2638377398,0.1312838466,0.0653125204,0.0649160959,-4.4137444,-5.601555988,0.2905872097,2.1268259921,8.1205590693,10.27924545,9.9598746771,3.9166347574,10.907190908,7.9846798014,-4.126851014,-5.423728814,0.8047030422,2.8208428947,9.035237426,10.833084106,10.223712417,4.047918604,10.972503429,8.0495958973 +050,4,9,06,011,California,Colusa County,21419,21407,21435,21315,21274,21239,21156,21208,21476,21558,21389,21474,21558,28,-120,-41,-35,-83,52,268,82,-169,85,84,69,337,303,317,308,276,308,318,272,262,260,13,176,144,124,142,140,150,168,167,165,134,56,161,159,193,166,136,158,150,105,97,126,1,-32,-34,-22,-14,-12,-5,-28,-46,-49,-35,-30,-250,-166,-209,-240,-70,116,-40,-229,38,-8,-29,-282,-200,-231,-254,-82,111,-68,-275,-11,-43,1,1,0,3,5,-2,-1,0,1,-1,1,225,225,225,248,244,262,259,268,270,268,252,262,15.766081871,14.229026274,14.913085409,14.530015332,13.029931074,14.431637147,14.779011944,12.666775328,12.224995917,12.084030489,8.2339181287,6.7623095165,5.83350975,6.6989031725,6.6093853272,7.0283947146,7.807779895,7.777027499,7.6989478105,6.2279234058,7.5321637427,7.4667167578,9.0795756592,7.8311121595,6.4205457464,7.4032424328,6.9712320491,4.8897478287,4.5260481068,5.8561070831,-1.497076023,-1.596656414,-1.034977536,-0.660455242,-0.566518742,-0.234279824,-1.301296649,-2.142175239,-2.286354198,-1.626696412,-11.69590643,-7.795440137,-9.832286595,-11.32208987,-3.304692664,5.4352919127,-1.858995213,-10.66430717,1.7730910109,-0.371816323,-13.19298246,-9.392096551,-10.86726413,-11.98254511,-3.871211406,5.2010120888,-3.160291862,-12.80648241,-0.513263187,-1.998512735 +050,4,9,06,013,California,Contra Costa County,1049025,1049188,1052516,1065361,1077439,1093253,1108665,1124148,1137259,1145623,1150840,1152883,1152333,3328,12845,12078,15814,15412,15483,13111,8364,5217,2043,-550,3010,12331,11940,12244,12243,12569,12590,12162,12112,11922,11771,1739,7263,6988,7246,7227,7568,7800,7842,8047,8076,9228,1271,5068,4952,4998,5016,5001,4790,4320,4065,3846,2543,488,3007,2705,3426,4027,5125,4854,4312,3138,1877,1515,1568,4790,4560,7391,6444,5429,3517,-205,-1963,-3704,-4664,2056,7797,7265,10817,10471,10554,8371,4107,1175,-1827,-3149,1,-20,-139,-1,-75,-72,-50,-63,-23,24,56,10486,10606,10764,10763,10696,10552,10788,10541,10495,10604,10417,10284,11.644680026,11.144297181,11.281195121,11.120305116,11.258443945,11.134660855,10.654952818,10.548395511,10.350202694,10.212492018,6.8587552535,6.5223072615,6.6762120098,6.5642771438,6.7788928137,6.8983601802,6.8702631148,7.0081686489,7.0112596002,8.0061911769,4.7859247728,4.6219899197,4.6049831114,4.556027972,4.4795511312,4.2363006748,3.7846897036,3.5402268619,3.3389430934,2.2063008412,2.8396361073,2.5247339929,3.1565970667,3.6577202239,4.5906217852,4.2929026044,3.777681019,2.7328983746,1.6295361899,1.31441045,4.5233977233,4.2561134964,6.8098099592,5.8530789975,4.8629240335,3.1104529171,-0.179597544,-1.709585567,-3.215664383,-4.046475471,7.3630338306,6.7808474893,9.966407026,9.5107992214,9.4535458187,7.4033555216,3.5980834752,1.0233128076,-1.586128193,-2.732065021 +050,4,9,06,015,California,Del Norte County,28610,28610,28568,28447,28195,27821,27182,27198,27415,27383,27793,27903,27968,-42,-121,-252,-374,-639,16,217,-32,410,110,65,90,334,324,332,311,301,316,278,282,276,267,93,297,283,275,273,291,306,328,262,254,306,-3,37,41,57,38,10,10,-50,20,22,-39,2,4,16,-6,-1,9,44,34,22,17,16,-44,-161,-317,-436,-700,1,165,-15,366,70,87,-42,-157,-301,-442,-701,10,209,19,388,87,103,3,-1,8,11,24,-4,-2,-1,2,1,1,3818,3778,3717,3653,3447,3142,3112,2920,2639,3070,3048,3082,11.716215031,11.440274002,11.85375607,11.308474083,11.070246414,11.572336257,10.146355706,10.221835581,9.9109451307,9.5577312022,10.418310971,9.9925850076,9.8186232505,9.9267312692,10.702464141,11.206123084,11.971239826,9.4968827026,9.120942258,10.953804299,1.2979040603,1.447688994,2.0351328192,1.381742814,0.3677822729,0.3662131727,-1.82488412,0.7249528781,0.7900028727,-1.396073097,0.1403139525,0.5649518025,-0.214224507,-0.036361653,0.3310040456,1.6113379598,1.2409212015,0.7974481659,0.6104567653,0.5727479372,-5.647636587,-11.19310759,-15.56698086,-25.4531571,0.0367782273,6.0425173493,-0.547465236,13.266637669,2.5136455042,3.1143169086,-5.507322634,-10.62815579,-15.78120537,-25.48951875,0.3677822729,7.6538553092,0.6934559655,14.064085834,3.1241022695,3.6870648458 +050,4,9,06,017,California,El Dorado County,181058,181079,181161,180963,180613,181529,183157,184627,186027,188793,190925,193057,192925,82,-198,-350,916,1628,1470,1400,2766,2132,2132,-132,380,1632,1598,1498,1611,1611,1553,1638,1619,1584,1608,296,1311,1423,1327,1398,1557,1556,1577,1560,1571,1846,84,321,175,171,213,54,-3,61,59,13,-238,29,91,115,126,116,201,207,161,102,44,41,-12,-607,-642,650,1317,1228,1206,2548,1980,2086,67,17,-516,-527,776,1433,1429,1413,2709,2082,2130,108,-19,-3,2,-31,-18,-13,-10,-4,-9,-11,-2,1643,1641,1633,1641,1641,1693,1698,1651,1648,1646,1682,1643,9.0134870928,8.83908224,8.2729978848,8.8349977789,8.7605768603,8.3797827624,8.7401952937,8.5273808458,8.2503867369,8.3319947562,7.2406137124,7.8710976392,7.3286169514,7.666869581,8.4669262393,8.3959703659,8.4147057254,8.2166239156,8.1826752296,9.5652128856,1.7728733804,0.9679846007,0.9443809334,1.168128198,0.293650621,-0.016187604,0.3254895683,0.3107569301,0.0677115073,-1.233218129,0.5025902729,0.6361041662,0.6958596352,0.6361637134,1.0930328671,1.1169446438,0.8590790246,0.5372407945,0.2291774094,0.2124451399,-3.35244281,-3.55112065,3.5897520862,7.2226518155,6.6778326409,6.5074166204,13.595859346,10.428791893,10.865092635,0.3471664482,-2.849852537,-2.915016483,4.2856117214,7.858815529,7.770865508,7.6243612641,14.45493837,10.966032687,11.094270044,0.5596115881 +050,4,9,06,019,California,Fresno County,930450,930503,932011,939251,944779,951143,960072,968889,976231,984726,991298,997847,1000918,1508,7240,5528,6364,8929,8817,7342,8495,6572,6549,3071,3897,16320,15946,15731,15854,15657,15205,14794,14408,14441,14251,1590,5995,6268,6523,6322,6601,6569,7060,7192,7368,7941,2307,10325,9678,9208,9532,9056,8636,7734,7216,7073,6310,75,454,512,916,1273,1778,1925,1237,506,-59,41,-864,-3530,-4649,-3715,-1729,-1924,-3203,-440,-1145,-506,-3336,-789,-3076,-4137,-2799,-456,-146,-1278,797,-639,-565,-3295,-10,-9,-13,-45,-147,-93,-16,-36,-5,41,56,17523,17204,16835,16318,16819,17316,17900,17434,17396,16973,17669,17672,17.442773914,16.927543617,16.594564544,16.590493482,16.2336097,15.633996874,15.088551151,14.582818832,14.519806248,14.25980543,6.4074405401,6.6538218606,6.8810847704,6.6156868798,6.8440989735,6.7543390639,7.2005658462,7.2792638146,7.4082080492,7.9459065973,11.035333374,10.273721756,9.713479774,9.9748066021,9.3895107262,8.8796578103,7.8879853051,7.3035550176,7.1115981992,6.3138988325,0.4852340292,0.5435157614,0.9662844779,1.3321368867,1.843479469,1.9793123303,1.2616288883,0.5121395287,-0.05932197,0.0410253331,-3.772854897,-4.935165576,-3.918937593,-1.809320249,-1.994856298,-3.293370075,-0.448760478,-1.158892807,-0.508761302,-3.338061253,-3.287620868,-4.391649814,-2.952653115,-0.477183362,-0.151376829,-1.314057745,0.8128684107,-0.646753278,-0.568083272,-3.29703592 +050,4,9,06,021,California,Glenn County,28122,28121,28125,28131,27836,27784,27802,27723,27796,27876,27899,28445,28283,4,6,-295,-52,18,-79,73,80,23,546,-162,108,424,372,385,408,394,379,382,367,383,385,29,236,241,212,270,267,262,255,283,257,249,79,188,131,173,138,127,117,127,84,126,136,-4,-24,-26,-26,-28,-11,-15,-24,-30,-46,-25,-72,-158,-411,-203,-91,-196,-26,-21,-30,467,-273,-76,-182,-437,-229,-119,-207,-41,-45,-60,421,-298,1,0,11,4,-1,1,-3,-2,-1,-1,0,316,316,316,316,325,336,317,316,317,317,334,319,15.073947668,13.293547984,13.843941028,14.679955384,14.191805493,13.652983663,13.723236097,13.160017929,13.595058924,13.573543929,8.3902161547,8.6122179141,7.6231571377,9.7146763574,9.6172895092,9.4382103424,9.1607989654,10.147915733,9.1225330115,8.778733606,6.6837315131,4.6813300695,6.2207838907,4.9652790271,4.5745159838,4.2147733208,4.5624371318,3.0121021963,4.4725259123,4.7948103229,-0.853242321,-0.929118945,-0.934915498,-1.007447919,-0.39621792,-0.540355554,-0.862192844,-1.075750784,-1.63282692,-0.881398956,-5.617178612,-14.6872264,-7.299532542,-3.274205735,-7.059882936,-0.936616294,-0.754418738,-1.075750784,16.576742865,-9.624876604,-6.470420933,-15.61634535,-8.23444804,-4.281653654,-7.456100855,-1.476971847,-1.616611582,-2.151501569,14.943915945,-10.50627556 +050,4,9,06,023,California,Humboldt County,134623,134613,135010,135257,134597,134447,134556,135177,136477,136710,136502,135839,134977,397,247,-660,-150,109,621,1300,233,-208,-663,-862,384,1549,1439,1539,1484,1445,1522,1424,1333,1407,1370,287,1187,1289,1292,1347,1295,1320,1387,1328,1442,1523,97,362,150,247,137,150,202,37,5,-35,-153,20,72,59,52,19,46,68,59,35,8,13,253,-185,-867,-433,-20,435,1028,138,-240,-635,-725,273,-113,-808,-381,-1,481,1096,197,-205,-627,-712,27,-2,-2,-16,-27,-10,2,-1,-8,-1,3,5014,5283,5538,5534,5482,5454,5484,5514,5503,5546,5485,5258,11.462738699,10.665026273,11.440507872,11.033334201,10.714298955,11.205430437,10.425093434,9.7579901322,10.332634455,10.117570601,8.7839062853,9.5533140142,9.6043769792,10.0147582,9.6020879907,9.7182445316,10.154216709,9.7213885188,10.589665162,11.24748907,2.6788324139,1.1117122592,1.8361308931,1.018576001,1.1122109642,1.4871859056,0.2708767255,0.0366016134,-0.257030708,-1.129918469,0.532806447,0.4372734886,0.3865538722,0.1412623651,0.341078029,0.5006368395,0.4319385622,0.2562112938,0.0587498761,0.0960061444,-1.369016565,-6.425696858,-3.218804359,-0.148697226,3.2254117961,7.5684510443,1.0102969761,-1.756877443,-4.663271413,-5.354188822,-0.836210118,-5.98842337,-2.832250487,-0.007434861,3.5664898251,8.0690878839,1.4422355383,-1.500666149,-4.604521537,-5.258182678 +050,4,9,06,025,California,Imperial County,174528,174522,174704,175731,176487,176301,177786,178701,179881,181250,181062,180439,180267,182,1027,756,-186,1485,915,1180,1369,-188,-623,-172,688,3128,3015,3012,3166,3290,3128,2960,2743,2604,2541,181,978,955,969,1023,1031,1124,1022,1117,1096,1120,507,2150,2060,2043,2143,2259,2004,1938,1626,1508,1421,-73,-124,-80,169,300,516,700,207,-38,-131,-75,-267,-1000,-1241,-2470,-959,-1872,-1525,-771,-1787,-2003,-1522,-340,-1124,-1321,-2301,-659,-1356,-825,-564,-1825,-2134,-1597,15,1,17,72,1,12,1,-5,11,3,4,10684,10434,10138,10060,8794,8807,8932,8891,9478,9071,8742,8535,17.852098107,17.120079042,17.075410728,17.882610771,18.45789608,17.446497593,16.392943281,15.141645874,14.406599152,14.089036501,5.5816342546,5.4227779387,5.4933841287,5.7782409408,5.7842221455,6.269137882,5.6599959571,6.1659564133,6.0636070163,6.2100436366,12.270463852,11.697301103,11.5820266,12.10436983,12.673673935,11.177359711,10.732947324,8.975689461,8.3429921356,7.878992864,-0.707691869,-0.454264121,0.9580824745,1.6944988096,2.8949162242,3.9042673642,1.1463983984,-0.20976396,-0.724755948,-0.415851136,-5.707192489,-7.04677217,-14.00274386,-5.416747861,-10.50248677,-8.505725329,-4.269918672,-9.86442624,-11.08157377,-8.439005728,-6.414884358,-7.50103629,-13.04466138,-3.722249052,-7.607570543,-4.601457965,-3.123520274,-10.0741902,-11.80632972,-8.854856864 +050,4,9,06,027,California,Inyo County,18546,18533,18503,18385,18344,18348,18280,18097,17897,17819,17894,17993,18046,-30,-118,-41,4,-68,-183,-200,-78,75,99,53,40,191,228,211,238,196,199,196,186,189,181,35,199,203,198,207,191,194,261,197,164,192,5,-8,25,13,31,5,5,-65,-11,25,-11,-2,3,6,10,8,20,4,9,8,4,4,-34,-113,-68,-20,-104,-209,-210,-21,79,70,61,-36,-110,-62,-10,-96,-189,-206,-12,87,74,65,1,0,-4,1,-3,1,1,-1,-1,0,-1,433,434,436,433,433,442,433,432,433,432,412,410,10.355671221,12.415257698,11.501144664,12.995522551,10.776039805,11.057398455,10.975473177,10.416374989,10.533062112,10.044673826,10.789416612,11.053935582,10.792543334,11.302828437,10.501140831,10.779574374,14.615298466,11.032397166,9.1397999276,10.655123616,-0.433745391,1.361322116,0.70860133,1.6926941138,0.2748989746,0.2778240818,-3.639825288,-0.616022177,1.3932621841,-0.610449791,0.1626545218,0.3267173078,0.5450779461,0.4368242874,1.0995958985,0.2222592654,0.5039758092,0.4480161286,0.2229219495,0.221981742,-6.126653654,-3.702796156,-1.090155892,-5.678715737,-11.49077714,-11.66861144,-1.175943555,4.4241592697,3.9011341154,3.3852215655,-5.963999133,-3.376078848,-0.545077946,-5.241891449,-10.39118124,-11.44635217,-0.671967746,4.8721753983,4.1240560649,3.6072033075 +050,4,9,06,029,California,Kern County,839631,839619,841365,848651,854392,862727,869837,876548,881094,887316,893618,898898,901362,1746,7286,5741,8335,7110,6711,4546,6222,6302,5280,2464,3485,14406,14210,14416,14090,14080,13817,13544,12930,13010,12826,1368,5404,5235,5651,5638,5915,5814,6105,6298,6544,6980,2117,9002,8975,8765,8452,8165,8003,7439,6632,6466,5846,142,534,701,1046,971,1197,1162,466,-143,-496,-316,-487,-2234,-3993,-1406,-2190,-2584,-4617,-1669,-175,-723,-3122,-345,-1700,-3292,-360,-1219,-1387,-3455,-1203,-318,-1219,-3438,-26,-16,58,-70,-123,-67,-2,-14,-12,33,56,36757,36504,36145,32198,31063,31769,32518,32384,33020,33165,32658,30547,17.048359305,16.68777594,16.790915481,16.264911426,16.124737672,15.722200539,15.317714783,14.520470719,14.515909481,14.249052915,6.3952057259,6.1478189335,6.5819550072,6.5082732875,6.7739931344,6.6156816917,6.9045074389,7.0726933171,7.3014689967,7.7544354704,10.65315358,10.539957006,10.208960474,9.7566381386,9.350744538,9.1065188474,8.4132073445,7.4477774022,7.2144404848,6.4946174441,0.6319466798,0.8232322965,1.2183197554,1.1208821146,1.3708317467,1.3222260278,0.5270271034,-0.160589893,-0.553412076,-0.351060402,-2.643761953,-4.689253295,-1.637626746,-2.52804514,-2.959255834,-5.253629579,-1.887571321,-0.196526092,-0.80668736,-3.4683879,-2.011815273,-3.866020999,-0.41930699,-1.407163025,-1.588424087,-3.931403551,-1.360544218,-0.357115985,-1.360099436,-3.819448302 +050,4,9,06,031,California,Kings County,152982,152990,152342,151779,150884,150237,149373,149960,149269,149542,151221,152727,152692,-648,-563,-895,-647,-864,587,-691,273,1679,1506,-35,570,2577,2395,2465,2301,2357,2251,2308,2301,2209,2184,215,752,815,802,813,801,788,841,938,843,986,355,1825,1580,1663,1488,1556,1463,1467,1363,1366,1198,53,-27,263,121,128,225,140,-7,-158,-129,-94,-1159,-2377,-2815,-2495,-2551,-1198,-2304,-1196,471,260,-1143,-1106,-2404,-2552,-2374,-2423,-973,-2164,-1203,313,131,-1237,103,16,77,64,71,4,10,9,3,9,4,21580,20893,20124,19475,18389,17020,16756,16228,15261,15986,16404,15835,16.947201936,15.826182916,16.372156044,15.359967958,15.748347159,15.045333173,15.447891811,15.301084242,14.535381052,14.301664271,4.9454000217,5.3855277982,5.3267623314,5.4270551717,5.3518990556,5.2668691871,5.6289761756,6.2374693696,5.5470014608,6.4567037414,12.001801914,10.440655118,11.045393712,9.9329127866,10.396448103,9.7784639858,9.8189156356,9.0636148728,8.9883795912,7.8449605296,-0.177560905,1.7379065165,0.8036636435,0.8544441107,1.5033424313,0.9357381805,-0.046852358,-1.050661152,-0.848829405,-0.615547821,-15.63193597,-18.60154694,-16.57141149,-17.02880411,-8.004463257,-15.39957691,-8.005060055,3.132034193,1.7108189559,-7.48479957,-15.80949688,-16.86364042,-15.76774785,-16.17436,-6.501120825,-14.46383873,-8.051912413,2.0813730412,0.8619895508,-8.100347392 +050,4,9,06,033,California,Lake County,64665,64662,64736,64258,63966,63811,64056,64266,63912,64132,64394,64463,64479,74,-478,-292,-155,245,210,-354,220,262,69,16,162,740,727,743,768,710,724,776,755,716,732,167,799,854,829,828,844,862,932,846,873,917,-5,-59,-127,-86,-60,-134,-138,-156,-91,-157,-185,-2,-27,-25,-18,-18,-3,22,-11,-28,-33,-23,80,-391,-131,-38,328,351,-234,388,382,263,226,78,-418,-156,-56,310,348,-212,377,354,230,203,1,-1,-9,-13,-5,-4,-4,-1,-1,-4,-2,1085,1085,1085,1125,1110,1164,1194,1133,1119,1128,1110,1101,11.473401864,11.339530821,11.629636006,12.012481719,11.065912314,11.296790401,12.120833463,11.748595615,11.11309436,11.353942082,12.388173093,13.320439231,12.975731157,12.950956854,13.154408441,13.45004603,14.557495861,13.16465151,13.549904157,14.223449303,-0.91477123,-1.98090841,-1.34609515,-0.938475134,-2.088496127,-2.153255629,-2.436662397,-1.416055895,-2.436809797,-2.86950722,-0.418624122,-0.3899426,-0.281740845,-0.28154254,-0.046757376,0.3432726365,-0.171815938,-0.435709506,-0.51219569,-0.356749546,-6.062297471,-2.043299226,-0.594786229,5.1303307343,5.4706129892,-3.651172588,6.0604167317,5.9443225495,4.0820444369,3.5054520637,-6.480921593,-2.433241827,-0.876527075,4.848788194,5.4238556132,-3.307899952,5.8886007935,5.5086130433,3.5698487471,3.1487025174 +050,4,9,06,035,California,Lassen County,34895,34895,34828,34235,33622,32128,31664,31256,30715,30919,30658,30694,30016,-67,-593,-613,-1494,-464,-408,-541,204,-261,36,-678,84,297,303,286,322,301,297,316,299,299,291,92,199,270,225,228,229,263,233,192,163,208,-8,98,33,61,94,72,34,83,107,136,83,2,25,18,8,15,11,6,9,8,6,2,-60,-722,-690,-1626,-582,-500,-585,112,-381,-107,-761,-58,-697,-672,-1618,-567,-489,-579,121,-373,-101,-759,-1,6,26,63,9,9,4,0,5,1,-2,9779,9830,9820,9604,8587,8710,8287,7701,7882,7644,7662,7045,8.6008427088,8.9305451169,8.6996197719,10.095309757,9.5677050223,9.5851285279,10.25408054,9.7114182243,9.7470335115,9.5865590512,5.7628542056,7.9579114903,6.8441064639,7.1482317532,7.2790845518,8.487841087,7.5607619171,6.2360946457,5.3136002086,6.852248394,2.8379885033,0.9726336266,1.855513308,2.9470780035,2.2886204704,1.0972874409,2.6933186228,3.4753235786,4.4334333029,2.7343106572,0.723976659,0.5305274327,0.2433460076,0.4702784048,0.3496503497,0.1936389602,0.2920465977,0.2598372769,0.1955926457,0.0658870038,-20.90844591,-20.33688492,-49.46007605,-18.24680211,-15.89319771,-18.87979862,3.6343576597,-12.37475031,-3.488068849,-25.07000494,-20.18446925,-19.80635749,-49.21673004,-17.7765237,-15.54354736,-18.68615966,3.9264042574,-12.11491304,-3.292476203,-25.00411794 +050,4,9,06,037,California,Los Angeles County,9818605,9818646,9821647,9873700,9931394,9987189,10033449,10077263,10094865,10092365,10061533,10011602,9943046,3001,52053,57694,55795,46260,43814,17602,-2500,-30832,-49931,-68556,31736,132633,129153,130664,129435,128536,122688,121087,113480,108800,107789,13806,58180,57984,60080,58126,60652,63172,62990,64454,66321,73513,17930,74453,71169,70584,71309,67884,59516,58097,49026,42479,34276,6283,32340,26618,31818,35319,41539,36989,30417,19529,8911,7573,-21698,-54778,-38795,-45695,-59714,-65200,-78923,-91033,-99487,-101328,-110428,-15415,-22438,-12177,-13877,-24395,-23661,-41934,-60616,-79958,-92417,-102855,486,38,-1298,-912,-654,-409,20,19,100,7,23,171735,171561,171062,173085,176389,178456,179069,177482,177717,178644,179674,180231,13.468460342,13.042402121,13.119808774,12.930157371,12.782839315,12.164110797,11.996395741,11.261345076,10.840359515,10.803397785,5.9079944111,5.855463246,6.0325576373,5.806608161,6.0318103108,6.263295573,6.2405788214,6.396182019,6.6079364285,7.3680076942,7.5604659314,7.1869388754,7.0872511363,7.1235492096,6.7510290038,5.9008152239,5.7558169199,4.8651630568,4.2324230869,3.4353900906,3.2840243942,2.6879953208,3.1948055743,3.5282591893,4.1310322578,3.6673374272,3.0134892207,1.9379873809,0.8878533423,0.7590211564,-5.562532105,-3.917678957,-4.588177784,-5.965244464,-6.48410658,-7.824955305,-9.01886985,-9.872730327,-10.09588188,-11.06789756,-2.27850771,-1.229683636,-1.393372209,-2.436985275,-2.353074322,-4.157617877,-6.005380629,-7.934742947,-9.208028542,-10.30887641 +050,4,9,06,039,California,Madera County,150865,150834,151006,151685,151520,151295,153357,153448,153694,155079,156373,156717,157761,172,679,-165,-225,2062,91,246,1385,1294,344,1044,578,2436,2377,2288,2262,2295,2280,2186,2155,2064,2042,325,1008,1049,1048,1046,1051,1086,1125,1116,1086,1178,253,1428,1328,1240,1216,1244,1194,1061,1039,978,864,-35,-87,-80,43,-61,2,-55,-149,-206,-250,-184,-39,-659,-1457,-1530,887,-1157,-893,479,465,-386,360,-74,-746,-1537,-1487,826,-1155,-948,330,259,-636,176,-7,-3,44,22,20,2,0,-6,-4,2,4,8624,8532,8473,7386,6718,8171,7800,7509,7768,7904,7417,7131,16.095622268,15.679160964,15.111536747,14.849730184,14.960642754,14.84655306,14.159269107,13.838408487,13.184707273,12.986600017,6.6602574903,6.9194109596,6.9217178806,6.8668513583,6.8512573133,7.0716476418,7.2869065624,7.1664333509,6.9373023731,7.4917800291,9.4353647779,8.7597500041,8.1898188663,7.9828788257,8.1093854403,7.7749054183,6.8723625447,6.6719751358,6.2474048995,5.4948199874,-0.574843652,-0.527695783,0.2840017833,-0.400456915,0.0130375972,-0.358140534,-0.965110291,-1.322836264,-1.596984893,-1.170193145,-4.354275482,-9.610659455,-10.10517973,5.8230374329,-7.542249963,-5.814899949,3.102602883,2.9860138962,-2.465744674,2.2895083281,-4.929119135,-10.13835524,-9.821177947,5.4225805181,-7.529212366,-6.173040483,2.1374925916,1.6631776325,-4.062729567,1.1193151826 +050,4,9,06,041,California,Marin County,252409,252425,252906,255380,256087,258441,260403,260974,260722,259975,260091,259085,257332,481,2474,707,2354,1962,571,-252,-747,116,-1006,-1753,590,2386,2326,2325,2431,2302,2294,2225,2192,2097,2065,474,1830,1877,1890,1876,1957,1901,1959,1997,1945,2183,116,556,449,435,555,345,393,266,195,152,-118,164,679,641,634,600,751,741,692,519,321,255,225,1243,-361,1296,847,-500,-1379,-1700,-586,-1476,-1892,389,1922,280,1930,1447,251,-638,-1008,-67,-1155,-1637,-24,-4,-22,-11,-40,-25,-7,-5,-12,-3,2,9044,9193,9334,8605,8230,8331,8344,7955,8050,8218,8303,8416,9.3884151836,9.0954059597,9.0374090429,9.3708320805,8.8304624101,8.7943936699,8.546237063,8.4296993074,8.0781854323,7.9974129434,7.2006704887,7.3396719632,7.3465389639,7.2314607088,7.5070438474,7.2877691222,7.5245296209,7.6797944876,7.4926421868,8.4544079688,2.1877446949,1.7557339965,1.690870079,2.1393713717,1.3234185628,1.5066245476,1.0217074421,0.7499048198,0.5855432455,-0.456995025,2.6717241868,2.5065155719,2.4643945519,2.3128339154,2.8808328714,2.8407348341,2.6579757517,1.9959005203,1.2365748802,0.9875739954,4.8909472226,-1.411625774,5.0376267181,3.2649505439,-1.917997917,-5.286603693,-6.529709217,-2.253560125,-5.685933094,-7.327411762,7.5626714094,1.0948897974,7.50202127,5.5777844593,0.9628349544,-2.445868858,-3.871733465,-0.257659605,-4.449358214,-6.339837767 +050,4,9,06,043,California,Mariposa County,18251,18271,18302,18199,17912,17840,17745,17653,17498,17461,17361,17117,17160,31,-103,-287,-72,-95,-92,-155,-37,-100,-244,43,31,148,141,136,157,145,157,146,141,143,136,22,155,156,204,185,186,193,215,218,185,185,9,-7,-15,-68,-28,-41,-36,-69,-77,-42,-49,2,4,10,19,14,14,24,15,9,6,7,20,-100,-291,-19,-78,-63,-143,17,-30,-207,87,22,-96,-281,0,-64,-49,-119,32,-21,-201,94,0,0,9,-4,-3,-2,0,0,-2,-1,-2,725,725,725,725,725,727,725,725,725,728,726,726,8.1093668667,7.8092547977,7.6079659879,8.8239426725,8.1925532516,8.9328895337,8.352641666,8.0983286428,8.29514473,7.9353502349,8.4929180022,8.6400265847,11.411948982,10.397639455,10.509068309,10.981195414,12.300123001,12.520820171,10.731480944,10.794410246,-0.383551136,-0.830771787,-3.803982994,-1.573696782,-2.316515057,-2.04830588,-3.947481335,-4.422491528,-2.436336214,-2.859060011,0.2191720775,0.553847858,1.0628776013,0.7868483912,0.7910051415,1.3655372536,0.8581481164,0.5169145942,0.3480480306,0.4084371444,-5.479301937,-16.11697267,-1.062877601,-4.383869608,-3.559523137,-8.136326136,0.9725678652,-1.723048647,-12.00765706,5.0762902238,-5.260129859,-15.56312481,0,-3.597021217,-2.768517995,-6.770788882,1.8307159816,-1.206134053,-11.65960903,5.4847273682 +050,4,9,06,045,California,Mendocino County,87841,87850,87796,87335,87293,87070,87247,87131,87319,87690,87549,86932,86061,-54,-461,-42,-223,177,-116,188,371,-141,-617,-871,303,1011,1123,1063,1057,1022,1005,1035,946,924,890,178,838,812,849,845,854,902,838,881,849,979,125,173,311,214,212,168,103,197,65,75,-89,11,17,-30,14,4,0,50,22,-13,-38,-24,-194,-652,-311,-443,-18,-272,39,157,-187,-651,-756,-183,-635,-341,-429,-14,-272,89,179,-200,-689,-780,4,1,-12,-8,-21,-12,-4,-5,-6,-3,-2,2044,2005,1954,1989,1942,1983,1977,1991,1972,1978,1981,1970,11.545642976,12.861625856,12.19295378,12.127331241,11.721662136,11.521926053,11.827963133,10.796683387,10.591411099,10.289433677,9.5699790443,9.2997686511,9.7383045715,9.6949809829,9.7948135659,10.34107194,9.5766503437,10.054839391,9.7317186399,11.318377044,1.9756639316,3.561857205,2.4546492088,2.4323502584,1.9268485703,1.1808541129,2.2513127896,0.7418439959,0.8596924594,-1.028943368,0.1941403863,-0.343587512,0.1605845277,0.0458934011,0,0.5732301519,0.2514156415,-0.148368799,-0.435577513,-0.277467874,-7.445854817,-3.561857205,-5.081353269,-0.206520305,-3.11965959,0.4471195185,1.7941934415,-2.134228111,-7.462130547,-8.740238044,-7.251714431,-3.905444717,-4.920768741,-0.160626904,-3.11965959,1.0203496704,2.045609083,-2.282596911,-7.89770806,-9.017705919 +050,4,9,06,047,California,Merced County,255793,255797,256709,259249,260776,261888,264241,266133,267370,270837,273733,277114,279252,912,2540,1527,1112,2353,1892,1237,3467,2896,3381,2138,1068,4303,4302,4190,4211,4105,4089,4307,3867,3940,3855,432,1454,1563,1615,1610,1676,1793,1832,1782,1808,1922,636,2849,2739,2575,2601,2429,2296,2475,2085,2132,1933,8,39,-79,34,75,179,253,-11,-201,-299,-205,268,-340,-1126,-1513,-281,-704,-1316,1016,1014,1546,392,276,-301,-1205,-1479,-206,-525,-1063,1005,813,1247,187,0,-8,-7,16,-42,-12,4,-13,-2,2,18,4896,5137,5362,5610,5645,6454,6444,5751,6375,6688,7008,6943,16.67965222,16.545358396,16.033245068,16.007481055,15.479642667,15.328873502,16.004994361,14.20203096,14.305242654,13.857784264,5.6361176685,6.0112494592,6.1798784688,6.1201720491,6.32006848,6.7216116873,6.807789568,6.544613181,6.5644362228,6.9091209743,11.043534551,10.534108937,9.8533665988,9.887309006,9.1595741873,8.6072618148,9.197204793,7.6574177792,7.7408064308,6.94866329,0.1511750956,-0.303831547,0.1301027046,0.2851011824,0.6749953806,0.9484482749,-0.040876466,-0.73819711,-1.085600902,-0.736924974,-1.317936731,-4.330561031,-5.789570355,-1.068179097,-2.654730436,-4.933430552,3.775499018,3.7240391502,5.613173894,1.4091443402,-1.166761636,-4.634392577,-5.65946765,-0.783077914,-1.979735055,-3.984982278,3.7346225523,2.9858420405,4.5275729921,0.6722193664 +050,4,9,06,049,California,Modoc County,9686,9686,9698,9513,9358,9154,9078,9064,8957,8864,8816,8866,8763,12,-185,-155,-204,-76,-14,-107,-93,-48,50,-103,26,98,74,81,74,93,87,84,90,74,68,17,100,124,113,111,122,113,103,78,77,104,9,-2,-50,-32,-37,-29,-26,-19,12,-3,-36,0,8,8,12,12,10,-1,-1,-4,-4,-2,4,-192,-115,-188,-51,6,-80,-72,-55,59,-64,4,-184,-107,-176,-39,16,-81,-73,-59,55,-66,-1,1,2,4,0,-1,0,-1,-1,-2,-1,357,359,361,357,357,357,356,357,314,321,356,333,10.202488158,7.8427216364,8.7510803803,8.1175954366,10.252452872,9.655402031,9.4270804108,10.180995475,8.3700938808,7.7145612343,10.410702202,13.141857877,12.208297321,12.176393155,13.449454305,12.540924477,11.559396218,8.8235294118,8.7094220111,11.798740711,-0.208214044,-5.299136241,-3.45721694,-4.058797718,-3.197001433,-2.885522446,-2.132315807,1.3574660633,-0.33932813,-4.084179477,0.8328561761,0.8478617985,1.2964563526,1.3163668276,1.1024142873,-0.110981633,-0.112227148,-0.452488688,-0.452437507,-0.22689886,-19.98854823,-12.18801335,-20.31114952,-5.594559017,0.6614485724,-8.878530603,-8.080354638,-6.221719457,6.6734532293,-7.260763515,-19.15569205,-11.34015156,-19.01469317,-4.27819219,1.7638628597,-8.989512236,-8.192581786,-6.674208145,6.2210157222,-7.487662374 +050,4,9,06,051,California,Mono County,14202,14204,14256,14424,14328,14064,14130,14074,14256,14333,14400,14450,14534,52,168,-96,-264,66,-56,182,77,67,50,84,31,155,146,136,157,157,137,140,135,119,119,20,38,49,52,51,46,57,62,32,35,42,11,117,97,84,106,111,80,78,103,84,77,3,7,19,33,38,108,84,77,57,39,33,31,44,-216,-389,-77,-278,19,-76,-93,-73,-29,34,51,-197,-356,-39,-170,103,1,-36,-34,4,7,0,4,8,-1,3,-1,-2,0,0,3,222,275,334,328,337,338,337,322,337,339,338,337,10.808926081,10.155815248,9.5801634263,11.137121373,11.1331726,9.6717260854,9.7939767043,9.3968607524,8.2495667244,8.2114269942,2.649930265,3.408458542,3.663003663,3.6177910194,3.2619486598,4.0240028239,4.3373325405,2.2274040302,2.4263431542,2.8981507038,8.1589958159,6.7473567056,5.9171597633,7.519330354,7.8712239399,5.6477232616,5.4566441638,7.1694567222,5.8232235702,5.3132762904,0.4881450488,1.3216471898,2.3245984784,2.6956089948,7.6584881577,5.9301094246,5.3866871874,3.9675634288,2.7036395147,2.2771184102,3.0683403068,-15.02504174,-27.40208509,-5.462155068,-19.71351581,1.3413342746,-5.316730211,-6.473392963,-5.060658579,-2.001104057,3.5564853556,-13.70339455,-25.07748662,-2.766546074,-12.05502766,7.2714436993,0.0699569765,-2.505829534,-2.357019064,0.2760143527 +050,4,9,06,053,California,Monterey County,415057,415058,416358,420379,424222,426163,427985,430178,433436,433803,433359,433380,430906,1300,4021,3843,1941,1822,2193,3258,367,-444,21,-2474,1673,6861,6808,6563,6460,6454,6346,6016,5823,5904,5799,517,2323,2377,2462,2375,2488,2610,2557,2614,2736,2892,1156,4538,4431,4101,4085,3966,3736,3459,3209,3168,2907,71,8,292,345,534,890,980,275,-252,-412,-260,93,-515,-808,-2518,-2806,-2651,-1439,-3371,-3406,-2736,-5111,164,-507,-516,-2173,-2272,-1761,-459,-3096,-3658,-3148,-5371,-20,-10,-72,13,9,-12,-19,4,5,1,-10,18702,18993,19246,19069,18245,17393,17414,17988,18017,17682,17659,17092,16.399418216,16.121221737,15.43536163,15.126184221,15.041431523,14.696380559,13.873914803,13.430016537,13.623478348,13.419169118,5.5525212821,5.628693312,5.7903185028,5.5610971401,5.7984322326,6.0443670436,5.8968750252,6.0288619658,6.3133192345,6.6922291927,10.846896934,10.492528425,9.6450431275,9.5650870809,9.2429992903,8.6520135153,7.977039778,7.4011545709,7.3101591136,6.726939925,0.0191218985,0.691450756,0.8113971907,1.2503687885,2.0741980253,2.2695324532,0.634196571,-0.58120628,-0.950689885,-0.601652694,-1.230972217,-1.913329489,-5.922023554,-6.570289926,-6.178313444,-3.332507347,-7.774096875,-7.855510274,-6.313319235,-11.82710353,-1.211850319,-1.221878733,-5.110626363,-5.319921138,-4.104115419,-1.062974894,-7.139900304,-8.436716554,-7.264009119,-12.42875622 +050,4,9,06,055,California,Napa County,136484,136535,136752,137668,138504,139522,140331,140766,140778,139818,138620,137678,135965,217,916,836,1018,809,435,12,-960,-1198,-942,-1713,386,1502,1528,1412,1481,1466,1459,1299,1269,1253,1226,321,1160,1129,1245,1166,1222,1224,1298,1285,1174,1415,65,342,399,167,315,244,235,1,-16,79,-189,39,189,190,154,148,160,166,97,23,-71,-29,128,390,273,708,370,49,-383,-1059,-1206,-949,-1490,167,579,463,862,518,209,-217,-962,-1183,-1020,-1519,-15,-5,-26,-11,-24,-18,-6,1,1,-1,-5,4966,4966,4992,5018,5030,4996,5013,4965,5048,5017,5057,5079,10.946724,11.065567835,10.157323416,10.584128096,10.430563115,10.364276987,9.2588632767,9.1151351468,9.0699172632,8.9605800258,8.4541943007,8.1760641919,8.9559969212,8.3329462253,8.6945075899,8.6949109198,9.2517355914,9.2300619887,8.4980709234,10.341941873,2.492529699,2.8895036427,1.2013264946,2.2511818705,1.7360555253,1.6693660671,0.0071276854,-0.114926842,0.5718463398,-1.381361847,1.3774506231,1.3759541156,1.1078100609,1.0576981487,1.1383970658,1.1792117751,0.6913854795,0.1652073352,-0.51393785,-0.211954992,2.8423584287,1.9770288081,5.0930488515,2.6442453717,0.3486341014,-2.720711505,-7.548218791,-8.662610707,-6.869394639,-10.89010134,4.2198090518,3.3529829237,6.2008589125,3.7019435203,1.4870311672,-1.54149973,-6.856833312,-8.497403372,-7.383332489,-11.10205633 +050,4,9,06,057,California,Nevada County,98764,98749,98795,98716,98165,97969,98605,98716,98939,99421,99472,99648,99606,46,-79,-551,-196,636,111,223,482,51,176,-42,217,770,773,804,863,828,810,797,789,801,790,190,944,953,1008,965,1024,985,1045,1059,1010,1065,27,-174,-180,-204,-102,-196,-175,-248,-270,-209,-275,10,10,15,4,30,32,30,16,6,-10,-4,25,92,-373,22,709,288,373,718,323,400,239,35,102,-358,26,739,320,403,734,329,390,235,-16,-7,-13,-18,-1,-13,-5,-4,-8,-5,-2,1175,1175,1175,1175,1175,1155,1222,1201,1176,1176,1177,1172,7.7970340892,7.8524590997,8.1984765517,8.7804083958,8.3924164179,8.1960992639,8.0358943335,7.9339142152,8.0453997589,7.9295773234,9.558961273,9.680974802,10.27868702,9.8181855179,10.379027068,9.9668614505,10.536398467,10.648941893,10.1446364,10.689873227,-1.761927184,-1.828515702,-2.080210468,-1.037777122,-1.98661065,-1.770762187,-2.500504134,-2.715027678,-2.099236641,-2.760295904,0.101260183,0.1523763085,0.0407884406,0.3052285653,0.3243445959,0.303559232,0.1613228473,0.0603339484,-0.100441945,-0.040149759,0.9315936834,-3.789090872,0.2243364231,7.2135684272,2.9191013628,3.7742531178,7.2393627748,3.2479775558,4.0176777822,2.3989480763,1.0328538664,-3.636714564,0.2651248636,7.5187969925,3.2434459586,4.0778123498,7.4006856221,3.3083115042,3.9172358377,2.3587983177 +050,4,9,06,059,California,Orange County,3010232,3010258,3016376,3050199,3078710,3105262,3126523,3148952,3164277,3174159,3175579,3170851,3166857,6118,33823,28511,26552,21261,22429,15325,9882,1420,-4728,-3994,9305,38240,37846,37619,37893,38565,37300,38261,36521,35514,35163,4312,17667,17808,18779,18398,18977,19608,19823,20433,21161,23233,4993,20573,20038,18840,19495,19588,17692,18438,16088,14353,11930,1322,7924,7106,9349,10878,12679,11759,9531,5959,2765,2336,151,5419,2111,-1114,-8638,-9578,-14058,-18046,-20664,-21909,-18375,1473,13343,9217,8235,2240,3101,-2299,-8515,-14705,-19144,-16039,-348,-93,-744,-523,-474,-260,-68,-41,37,63,115,39273,40272,41213,43303,43734,43606,44178,43188,45038,44930,44010,43650,12.606783894,12.349995733,12.16661395,12.161202609,12.290703094,11.816457157,12.072694273,11.503151784,11.191803896,11.096440543,5.8243737199,5.8111484442,6.0734427646,5.9045682738,6.0479883993,6.2117182824,6.2548552987,6.4358560936,6.6686310256,7.3316725857,6.7824101738,6.5388472891,6.0931711851,6.2566343351,6.2427146949,5.6047388745,5.8178389748,5.06729569,4.5231728704,3.7647679571,2.6123471646,2.3188466332,3.0236230048,3.4911345626,4.0408096598,3.7251935578,3.007366486,1.8769278354,0.8713560222,0.7371750166,1.7865105105,0.688866485,-0.360286237,-2.772239415,-3.052517937,-4.453505488,-5.694149156,-6.508615001,-6.904354101,-5.798626254,4.398857675,3.0077131183,2.663336768,0.718895148,0.9882917229,-0.72831193,-2.68678267,-4.631687166,-6.032998079,-5.061451238 +050,4,9,06,061,California,Placer County,348432,348481,350007,356323,360269,365415,369241,372870,379046,385348,392735,398918,402950,1526,6316,3946,5146,3826,3629,6176,6302,7387,6183,4032,953,3853,3694,3691,3725,3649,3722,3780,3632,3678,3678,711,2788,2762,2835,2933,3077,3216,3311,3337,3363,3692,242,1065,932,856,792,572,506,469,295,315,-14,131,333,241,302,419,432,430,344,160,45,51,1108,4902,2791,3968,2647,2657,5243,5499,6942,5850,4017,1239,5235,3032,4270,3066,3089,5673,5843,7102,5895,4068,45,16,-18,20,-32,-32,-3,-10,-10,-27,-22,3807,3782,3747,3806,3840,3850,3880,3765,3923,3956,3945,3932,10.909914629,10.309911358,10.172471765,10.140800592,9.8341083746,9.900042026,9.8901875211,9.3357649505,9.2919498821,9.1735796914,7.8943270143,7.7087101168,7.8133181936,7.9846894329,8.2925600079,8.5541470058,8.663071662,8.5774910903,8.4961466703,9.2084981568,3.0155876149,2.6012012414,2.359153571,2.1561111595,1.5415483668,1.3458950202,1.2271158591,0.7582738602,0.7958032118,-0.034918465,0.942902043,0.672628218,0.8323181991,1.140669919,1.1642463189,1.14374478,0.9000593935,0.4112671784,0.1136861731,0.127202981,13.880197641,7.789648782,10.935889451,7.2060937364,7.1606538644,13.945706701,14.387868037,17.843854704,14.779202504,10.019105389,14.823099684,8.462277,11.76820765,8.3467636554,8.3249001834,15.089451481,15.28792743,18.255121883,14.892888677,10.14630837 +050,4,9,06,063,California,Plumas County,20007,20007,19915,19720,19380,18901,18631,18435,18691,18680,18830,19052,18967,-92,-195,-340,-479,-270,-196,256,-11,150,222,-85,42,169,156,148,160,148,173,180,157,153,154,87,224,205,264,234,236,223,210,189,163,212,-45,-55,-49,-116,-74,-88,-50,-30,-32,-10,-58,2,8,10,-2,1,3,12,6,3,1,1,-49,-148,-308,-364,-199,-108,295,13,179,232,-27,-47,-140,-298,-366,-198,-105,307,19,182,233,-26,0,0,7,3,2,-3,-1,0,0,-1,-1,277,277,277,279,277,277,277,280,280,279,286,280,8.527816324,7.9795396419,7.7322953946,8.526057764,7.9857551395,9.3196142865,9.6331379947,8.3711010397,8.0777150098,8.1012125516,11.303141163,10.485933504,13.792743136,12.46935948,12.734041979,12.013144427,11.238660994,10.077312717,8.6056702392,11.152318578,-2.775324839,-2.506393862,-6.060447742,-3.943301716,-4.74828684,-2.693530141,-1.605522999,-1.706211677,-0.527955229,-3.051106026,0.403683613,0.5115089514,-0.104490478,0.053287861,0.161873415,0.6464472337,0.3211045998,0.1599573447,0.0527955229,0.0526052763,-7.46814684,-15.7544757,-19.01726705,-10.60428434,-5.82744294,15.89182783,0.695726633,9.5441215676,12.248561322,-1.42034246,-7.064463227,-15.24296675,-19.12175753,-10.55099648,-5.665569525,16.538275063,1.0168312328,9.7040789123,12.301356845,-1.367737184 +050,4,9,06,065,California,Riverside County,2189641,2189785,2201562,2233840,2260763,2286087,2315238,2344648,2378282,2413058,2443221,2465569,2489188,11777,32278,26923,25324,29151,29410,33634,34776,30163,22348,23619,7219,31003,30105,29935,30349,30534,30316,30488,29252,28596,28383,3374,14460,14592,14986,14963,15760,16179,16410,17364,18058,19696,3845,16543,15513,14949,15386,14774,14137,14078,11888,10538,8687,-26,888,723,1535,2002,2956,2565,1261,-82,-1216,-781,7485,14839,10891,9149,12007,11844,16973,19476,18378,13014,15656,7459,15727,11614,10684,14009,14800,19538,20737,18296,11798,14875,473,8,-204,-309,-244,-164,-41,-39,-21,12,57,35945,35593,35152,35784,34345,33618,33299,33855,33452,33339,32859,34027,13.979792587,13.396066349,13.167357621,13.191417689,13.105041625,12.837793488,12.726293688,12.047083786,11.650936381,11.456868621,6.5202658068,6.4931207495,6.5918163124,6.5037788028,6.7641139719,6.8512554707,6.849858286,7.1511542067,7.3574139452,7.9503394415,7.4595267802,6.9029455994,6.5755413088,6.6876388866,6.3409276536,5.9865380177,5.8764354022,4.895929579,4.2935224363,3.5065291799,0.4004146637,0.3217191819,0.6751927158,0.8701841317,1.2687005648,1.0861901404,0.5263663192,-0.033770712,-0.495437776,-0.315252595,6.6911635067,4.8462567217,4.0243245324,5.2189315034,5.0833861601,7.1874874284,8.1296672747,7.5687578906,5.3023250129,6.3195833822,7.0915781704,5.1679759035,4.6995172482,6.0891156352,6.3520867249,8.2736775688,8.6560335939,7.5349871785,4.806887237,6.0043307876 +050,4,9,06,067,California,Sacramento County,1418788,1418736,1421381,1433712,1444819,1457283,1474828,1493547,1511401,1527984,1539550,1551660,1559146,2645,12331,11107,12464,17545,18719,17854,16583,11566,12110,7486,5027,20192,19530,19406,19653,19776,19688,19206,19192,19154,19084,2490,10206,10482,10432,10741,11121,11240,11609,11969,12402,13340,2537,9986,9048,8974,8912,8655,8448,7597,7223,6752,5744,654,3672,3301,4195,4777,5686,5471,4850,3375,1959,1599,-409,-1276,-941,-464,4040,4479,3977,4155,984,3340,39,245,2396,2360,3731,8817,10165,9448,9005,4359,5299,1638,-137,-51,-301,-241,-184,-101,-42,-19,-16,59,104,23787,23753,23730,23323,22253,23218,23133,22597,22553,22156,22948,23150,14.144548006,13.569421347,13.37375461,13.405358801,13.324462037,13.10372093,12.638083033,12.512982741,12.392558254,12.269489001,7.1493292863,7.282881442,7.1892717761,7.326462061,7.492988588,7.4809946794,7.639045399,7.8036624859,8.0240423653,8.5765554008,6.9952187197,6.2865399053,6.1844828335,6.0788967403,5.8314734493,5.6227262502,4.9990376343,4.7093202553,4.3685158886,3.6929335998,2.5722454575,2.2935309712,2.891007966,3.258403246,3.8310523435,3.6413275704,3.1914351094,2.2004646077,1.2674648439,1.0280293917,-0.893841286,-0.653805709,-0.319768223,2.7556937647,3.0178127764,2.6469676014,2.7341057484,0.6415576812,2.1609660942,0.0250738876,1.6784041711,1.6397252626,2.5712397428,6.0140970107,6.8488651198,6.2882951718,5.9255408578,2.8420222889,3.428430938,1.0531032793 +050,4,9,06,069,California,San Benito County,55269,55265,55544,56094,56704,57320,57891,58276,59270,60190,61415,62803,64055,279,550,610,616,571,385,994,920,1225,1388,1252,189,763,715,737,725,718,757,760,735,799,808,34,269,277,325,313,295,335,374,349,337,383,155,494,438,412,412,423,422,386,386,462,425,-9,-33,-39,-50,-36,0,9,-42,-61,-80,-48,125,91,221,258,203,-30,562,574,900,1008,878,116,58,182,208,167,-30,571,532,839,928,830,8,-2,-10,-4,-8,-8,1,2,0,-2,-3,289,322,415,413,402,396,400,387,399,404,400,397,13.669180745,12.677529743,12.927103066,12.585603805,12.361514027,12.880063975,12.723924326,12.088318737,12.864480188,12.738652667,4.8191476021,4.9114345999,5.7005542693,5.4335089531,5.078895039,5.6998962108,6.2615101289,5.7398955635,5.4259447101,6.0382474893,8.8500331428,7.7660951435,7.2265487967,7.1520948521,7.2826189882,7.1801677641,6.4624141972,6.3484231734,7.438535478,6.7004051774,-0.591196546,-0.691501622,-0.877008349,-0.624940327,0,0.15313154,-0.703164239,-1.003248222,-1.288058091,-0.756751644,1.6302692632,3.9185091934,4.5253630815,3.5239690655,-0.516497801,9.5622139418,9.6099112674,14.802022943,16.229531952,13.842248814,1.0390727172,3.2270075711,3.6483547323,2.8990287386,-0.516497801,9.7153454818,8.9067470283,13.798774721,14.94147386,13.08549717 +050,4,9,06,071,California,San Bernardino County,2035210,2035172,2040803,2060596,2073088,2082101,2098346,2114352,2130726,2149847,2165627,2177279,2189183,5631,19793,12492,9013,16245,16006,16374,19121,15780,11652,11904,7466,31439,30165,30564,30678,31277,30680,30511,29325,29007,28808,3057,12202,12092,12715,12893,13265,13876,14192,14632,15347,16533,4409,19237,18073,17849,17785,18012,16804,16319,14693,13660,12275,176,599,1397,1387,1673,2654,2379,1215,-24,-882,-556,1168,15,-6831,-10233,-2871,-4501,-2752,1678,1168,-1210,-1,1344,614,-5434,-8846,-1198,-1847,-373,2893,1144,-2092,-557,-122,-58,-147,10,-342,-159,-57,-91,-57,84,186,40059,40141,40220,40208,39291,40503,39109,37590,38219,37641,37277,38664,15.33086637,14.594729544,14.711244182,14.676899384,14.8489163,14.454386939,14.255568121,13.590627588,13.358336561,13.195122275,5.9501648096,5.8504713955,6.1200585581,6.1682399035,6.2976268415,6.5374534932,6.6308879676,6.7811786144,7.0676178577,7.5727213474,9.3807015606,8.7442581484,8.5911856236,8.5086594807,8.5512894587,7.9169334462,7.6246801538,6.8094489736,6.2907187031,5.6224009278,0.2920954533,0.6759103986,0.6675989949,0.8003928766,1.2600001234,1.1208274618,0.5676810091,-0.011122764,-0.406179641,-0.254668425,0.0073145773,-3.305042185,-4.925407725,-1.373537327,-2.136872854,-1.296560393,0.7840071878,0.541307861,-0.557230573,-0.000458037,0.2994100306,-2.629131787,-4.25780873,-0.573144451,-0.876872731,-0.175732931,1.3516881969,0.5301850967,-0.963410214,-0.255126462 +050,4,9,06,073,California,San Diego County,3095313,3095352,3103260,3137236,3175148,3210788,3249307,3280825,3305462,3319019,3332483,3330459,3332427,7908,33976,37912,35640,38519,31518,24637,13557,13464,-2024,1968,10719,44686,43831,43743,44247,44442,43311,42315,40513,39369,39080,4679,19667,19877,20732,19878,20555,21046,21531,21906,22814,25040,6040,25019,23954,23011,24369,23887,22265,20784,18607,16555,14040,2377,8863,14054,13571,14072,16772,13468,9188,4645,2756,2458,-204,180,441,-504,547,-8727,-10940,-16292,-9636,-21362,-14678,2173,9043,14495,13067,14619,8045,2528,-7104,-4991,-18606,-12220,-305,-86,-537,-438,-469,-414,-156,-123,-152,27,148,101966,101121,100184,102546,100986,104295,106549,106312,104579,109904,107956,110390,14.321297538,13.887304701,13.699792795,13.69856016,13.611363446,13.151871457,12.775340438,12.181609507,11.817302327,11.730652453,6.3030246314,6.2977790958,6.493018408,6.1540890653,6.2954317003,6.3908542097,6.5004337698,6.5867829552,6.8480259921,7.5162624724,8.0182729065,7.5895256055,7.2067743867,7.5444710952,7.3159317453,6.7610172469,6.2749066682,5.594826552,4.9692763347,4.2143899806,2.8404793465,4.4528343016,4.2502774848,4.3565922792,5.1368027476,4.089709422,2.7739531595,1.3966770212,0.8272621914,0.7378184168,0.0576877223,0.1397253399,-0.157846868,0.1693473548,-2.672840304,-3.322053837,-4.918724954,-2.897390695,-6.412182486,-4.405898585,2.8981670688,4.5925596415,4.0924306163,4.525939634,2.4639624436,0.767655585,-2.144771794,-1.500713673,-5.584920295,-3.668080168 +050,4,9,06,075,California,San Francisco County,805235,805184,805519,815694,828963,839695,850918,863237,871343,877471,879676,878826,866606,335,10175,13269,10732,11223,12319,8106,6128,2205,-850,-12220,2118,8899,8782,9096,8950,9103,8995,9010,8673,8707,8547,1277,5761,5543,5761,5472,5646,5694,5751,5960,6058,6898,841,3138,3239,3335,3478,3457,3301,3259,2713,2649,1649,1176,6222,6154,6659,6895,7437,6164,5572,4162,2684,2118,-1649,774,3631,665,753,1367,-1361,-2664,-4612,-6162,-15926,-473,6996,9785,7324,7648,8804,4803,2908,-450,-3478,-13808,-33,41,245,73,97,58,2,-39,-58,-21,-61,24270,24201,24098,23973,23971,24013,23562,23532,24162,24223,24223,25704,10.978199657,10.679430422,10.902174082,10.587875522,10.620976516,10.371386733,10.304126111,9.8716840424,9.9027467697,9.7935640002,7.107024185,6.7406152164,6.9049499658,6.4733916041,6.5875022971,6.56527805,6.5770287749,6.7837238433,6.8899552005,7.9040604274,3.8711754717,3.9388152058,3.9972241166,4.114483918,4.0334742191,3.8061086834,3.7270973357,3.0879601991,3.0127915692,1.8895035728,7.6757341571,7.4836272852,7.9812639858,8.156804662,8.6771616336,7.1071959783,6.3723186114,4.7372246033,3.0525981773,2.4269063475,0.9548406039,4.4155103465,0.7970476874,0.8908011473,1.5949549486,-1.569255958,-3.046636177,-5.249418518,-7.008237693,-18.24877738,8.630574761,11.899137632,8.7783116732,9.0476058093,10.272116582,5.5379400201,3.3256824339,-0.512193914,-3.955639516,-15.82187103 +050,4,9,06,077,California,San Joaquin County,685306,685298,687115,694265,699444,701831,711296,721919,732662,743286,752590,761571,767967,1817,7150,5179,2387,9465,10623,10743,10624,9304,8981,6396,2549,10549,10082,10052,9922,9978,10156,10127,9914,9941,9957,1098,4756,4982,4985,5114,5377,5371,5590,5649,5955,6339,1451,5793,5100,5067,4808,4601,4785,4537,4265,3986,3618,101,711,563,997,1121,1777,2006,1470,793,292,269,328,673,-390,-3708,3609,4287,3978,4644,4258,4694,2473,429,1384,173,-2711,4730,6064,5984,6114,5051,4986,2742,-63,-27,-94,31,-73,-42,-26,-27,-12,9,36,14354,14262,14157,13657,12707,14175,14866,15115,15095,15027,15755,15882,15.273132664,14.467869548,14.346934042,14.042616127,13.923940232,13.964158751,13.722705678,13.255109381,13.130704066,13.019617688,6.8858677554,7.1492686063,7.1149488858,7.2378491105,7.5034101653,7.3849445304,7.5747926079,7.5527650688,7.8657421503,8.2887773955,8.387264909,7.3186009418,7.2319851564,6.8047670167,6.420530067,6.5792142205,6.1479130701,5.702344312,5.2649619162,4.730840293,1.0294053772,0.8079161432,1.4229897772,1.5865523764,2.4797396064,2.7581825969,1.9919400955,1.0602483094,0.3856921424,0.3517401987,0.9743879309,-0.559657719,-5.292323063,5.1078211654,5.9823543572,5.4696163363,6.2929046281,5.6929852474,6.2001332751,3.2336561759,2.0037933081,0.2482584241,-3.869333286,6.6943735418,8.4620939636,8.2277989332,8.2848447235,6.7532335568,6.5858254175,3.5853963746 +050,4,9,06,079,California,San Luis Obispo County,269637,269599,269800,271056,274174,275713,278271,280138,281884,282473,283250,282728,282249,201,1256,3118,1539,2558,1867,1746,589,777,-522,-479,700,2645,2629,2631,2632,2599,2689,2525,2502,2449,2423,519,2256,2265,2258,2240,2308,2357,2519,2466,2500,2641,181,389,364,373,392,291,332,6,36,-51,-218,-12,34,61,168,226,226,172,50,-38,-104,-50,64,839,2644,1034,1934,1372,1250,544,783,-372,-222,52,873,2705,1202,2160,1598,1422,594,745,-476,-272,-32,-6,49,-36,6,-22,-8,-11,-4,5,11,17006,16859,16715,17358,16303,16609,15745,15780,15630,16236,15933,16154,9.7807919298,9.6436366304,9.5692387709,9.5020794824,9.308589224,9.5690204298,8.9482366658,8.8453182918,8.6540466237,8.5773403165,8.3423314154,8.3084202997,8.2125964062,8.0868761553,8.2663424121,8.3875720168,8.9269735292,8.718047525,8.8342656428,9.3490531473,1.4384605144,1.3352163307,1.3566423647,1.4152033272,1.0422468119,1.1814484131,0.0212631366,0.1272707668,-0.180219019,-0.771712831,0.1257266259,0.2237587807,0.6110346308,0.8159080407,0.8094425412,0.6120756839,0.1771928053,-0.134341365,-0.367505451,-0.176998356,3.1024893872,9.6986592814,3.7607726678,6.9821511091,4.913960914,4.4482244467,1.9278577213,2.7681391777,-1.314538728,-0.785872699,3.2282160131,9.9224180621,4.3718072986,7.7980591497,5.7234034552,5.0603001306,2.1050505265,2.6337978127,-1.682044178,-0.962871055 +050,4,9,06,081,California,San Mateo County,718451,718528,719948,728945,739700,749131,757653,765479,767928,768658,768410,764810,758308,1420,8997,10755,9431,8522,7826,2449,730,-248,-3600,-6502,2286,9140,9011,9068,8948,9168,9005,8739,8413,8328,8226,1115,4550,4660,4716,4516,4766,4657,4858,4819,4947,5556,1171,4590,4351,4352,4432,4402,4348,3881,3594,3381,2670,647,3484,3541,4264,4849,5733,4999,4459,3292,2142,1677,-301,936,2833,831,-673,-2240,-6878,-7585,-7117,-9099,-10815,346,4420,6374,5095,4176,3493,-1879,-3126,-3825,-6957,-9138,-97,-13,30,-16,-86,-69,-20,-25,-17,-24,-34,8853,9131,9505,9367,9469,9483,9488,9191,9328,9439,9363,9323,12.616528619,12.271175131,12.181369141,11.876951175,12.038352553,11.745087899,11.374566734,10.946815626,10.863411643,10.801526868,6.2806570257,6.3459855854,6.3351716884,5.9942234587,6.2581575333,6.0740560073,6.3231085016,6.2703797099,6.4530856629,7.2955608167,6.335871593,5.9251895455,5.8461974529,5.8827277168,5.7801950192,5.6710318917,5.0514582327,4.6764359157,4.4103259806,3.5059660512,4.8091888083,4.8221319652,5.7279839015,6.4362244356,7.5279095968,6.5201215333,5.8037753826,4.2834799762,2.7941195654,2.2020618232,1.2920208739,3.857977932,1.1163120596,-0.893293266,-2.941307779,-8.970873356,-9.872535608,-9.26048815,-11.86913815,-14.20113215,6.1012096822,8.6801098972,6.8442959611,5.54293117,4.5866018178,-2.450751823,-4.068760226,-4.977008174,-9.075018588,-11.99907033 +050,4,9,06,083,California,Santa Barbara County,423895,423947,424218,425404,429635,434503,438921,442051,444112,444998,445137,445464,444766,271,1186,4231,4868,4418,3130,2061,886,139,327,-698,1510,5751,5641,5703,5763,5809,5595,5511,5338,5483,5390,760,2863,2858,2984,2977,3008,3126,3233,3286,3248,3550,750,2888,2783,2719,2786,2801,2469,2278,2052,2235,1840,147,668,845,1016,1183,1533,1428,897,413,140,162,-635,-2373,668,1170,534,-1166,-1827,-2277,-2327,-2054,-2710,-488,-1705,1513,2186,1717,367,-399,-1380,-1914,-1914,-2548,9,3,-65,-37,-85,-38,-9,-12,1,6,10,17782,17606,17409,18305,18756,19060,19097,18838,19359,19620,20100,19942,13.537785039,13.194719773,13.19928067,13.196339922,13.187706306,12.627473727,12.396666329,11.993686351,12.313033558,12.109230199,6.7394676692,6.6850751837,6.9063043171,6.8168495484,6.8288208933,7.0551354548,7.2724409803,7.3831497469,7.2939509387,7.9754670141,6.7983173694,6.5096445893,6.2929763533,6.3794903735,6.3588854129,5.5723382719,5.1242253489,4.610536604,5.0190826195,4.1337631848,1.5724639899,1.9765180302,2.3514762688,2.7088790782,3.4802468183,3.2228833747,2.0177480852,0.9279491313,0.314394437,0.3639508891,-5.586013545,1.5625018274,2.7079008214,1.2227738189,-2.647076184,-4.123394906,-5.121975908,-5.228420408,-4.612615526,-6.088314256,-4.013549555,3.5390198576,5.0593770902,3.9316528971,0.8331706343,-0.900511531,-3.104227823,-4.300471277,-4.298221089,-5.724363367 +050,4,9,06,085,California,Santa Clara County,1781642,1781680,1786001,1811891,1837605,1866050,1891286,1915736,1928144,1932251,1931985,1922411,1907105,4321,25890,25714,28445,25236,24450,12408,4107,-266,-9574,-15306,5868,24023,23420,24179,23414,23691,23285,22550,21795,21198,21070,2170,9159,9307,9439,9432,9894,10108,10221,10218,10728,12110,3698,14864,14113,14740,13982,13797,13177,12329,11577,10470,8960,2663,14050,13528,16181,19198,22035,20226,17978,13244,8703,6959,-2009,-2974,-1556,-2163,-7622,-11261,-21023,-26266,-25110,-28716,-31149,654,11076,11972,14018,11576,10774,-797,-8288,-11866,-20013,-24190,-31,-50,-371,-313,-322,-121,28,66,23,-31,-76,30350,30050,29667,30121,30472,30960,30897,30496,30487,30786,30230,30408,13.353930579,12.834648949,13.056831697,12.463085548,12.445948566,12.115362602,11.68274231,11.280366934,10.99938875,11.00400155,5.0913145809,5.100430306,5.0971270272,5.0205784098,5.1977635012,5.25926928,5.2953130444,5.2884968723,5.5666309326,6.3245590304,8.2626159985,7.7342186428,7.9597046701,7.442507138,7.2481850643,6.8560933224,6.3874292657,5.9918700618,5.4327578173,4.6794425196,7.8101288199,7.4136264295,8.7378549028,10.218942357,11.575977234,10.523741636,9.3140727827,6.8546538048,4.5158826441,3.6344018409,-1.653190257,-0.852720485,-1.16803536,-4.057129839,-5.915910126,-10.9384268,-13.6079339,-12.99610065,-14.90038906,-16.26785213,6.1569385629,6.5609059443,7.5698195431,6.1618125182,5.6600671076,-0.414685162,-4.29386112,-6.141446847,-10.38450642,-12.63345028 +050,4,9,06,087,California,Santa Cruz County,262382,262345,263174,264927,266391,268836,270863,273495,274476,274865,273713,272870,269925,829,1753,1464,2445,2027,2632,981,389,-1152,-843,-2945,809,3244,3166,2981,2895,2983,2893,2665,2549,2451,2402,442,1700,1673,1725,1731,1719,1726,1783,1780,1782,2096,367,1544,1493,1256,1164,1264,1167,882,769,669,306,-8,88,13,241,294,376,388,229,75,-67,-26,438,127,13,953,601,996,-562,-710,-1998,-1449,-3219,430,215,26,1194,895,1372,-174,-481,-1923,-1516,-3245,32,-6,-55,-5,-32,-4,-12,-12,2,4,-6,10969,11622,12294,12642,12958,12961,13475,13706,13974,14100,14454,13687,12.285528715,11.917533379,11.139198882,10.728202202,10.959699316,10.558952937,9.7025344913,9.2931178429,8.9684457804,8.850486832,6.438162397,6.2975468552,6.4458631571,6.414686705,6.3156966555,6.2996034462,6.4914142582,6.4895055945,6.5205101512,7.7229893422,5.8473663182,5.6199865241,4.6933357248,4.3135154966,4.64400266,4.2593494911,3.2111202332,2.8036122484,2.4479356292,1.1274974898,0.3332695829,0.0489349128,0.9005524759,1.0894961821,1.3814438292,1.4161333355,0.8337262283,0.2734342245,-0.245159473,-0.09580044,0.4809686026,0.0489349128,3.5611058485,2.2271673655,3.6593565264,-2.05120344,-2.58491538,-7.28428774,-5.302030982,-11.86083144,0.8142381855,0.0978698256,4.4616583244,3.3166635476,5.0408003556,-0.635070104,-1.751189152,-7.010853516,-5.547190454,-11.95663188 +050,4,9,06,089,California,Shasta County,177223,177222,177277,177613,177908,178447,178904,178386,178592,179403,179666,179645,179027,55,336,295,539,457,-518,206,811,263,-21,-618,532,2107,2057,2108,2145,2096,2032,2004,2007,1954,1918,465,2048,2008,2070,2159,2282,2213,2400,2283,2351,2381,67,59,49,38,-14,-186,-181,-396,-276,-397,-463,36,157,135,227,213,331,268,233,188,118,102,-22,129,152,308,299,-649,133,985,356,263,-265,14,286,287,535,512,-318,401,1218,544,381,-163,-26,-9,-41,-34,-41,-14,-14,-11,-5,-5,8,2654,2654,2655,2648,2653,2746,2765,2832,2833,2832,2853,2924,11.874101834,11.571749629,11.830898963,12.005003484,11.7327661,11.384455064,11.195687091,11.178909903,10.876371723,10.695008253,11.541604441,11.29609784,11.617628488,12.083357819,12.773937138,12.398523158,13.408008492,12.716218888,13.086156561,13.276754249,0.3324973936,0.2756517899,0.2132704747,-0.078354335,-1.041171038,-1.014068094,-2.212321401,-1.537308985,-2.209784838,-2.581745996,0.8847811998,0.7594488089,1.2740104671,1.1921052411,1.8528366313,1.5014930892,1.3016941577,1.0471524972,0.6568126219,0.5687647767,0.7269858266,0.8550831034,1.728613321,1.6734247281,-3.632903244,0.7451439585,5.5028701518,1.9829057925,1.4639128777,-1.477673194,1.6117670264,1.6145319123,3.0026237881,2.8655299691,-1.780066613,2.2466370477,6.8045643096,3.0300582896,2.1207254996,-0.908908418 +050,4,9,06,091,California,Sierra County,3240,3239,3220,3100,3068,3031,2976,2990,2956,3008,2961,2959,2920,-19,-120,-32,-37,-55,14,-34,52,-47,-2,-39,7,18,21,21,17,23,30,35,28,21,18,20,35,31,38,41,36,32,32,38,23,40,-13,-17,-10,-17,-24,-13,-2,3,-10,-2,-22,0,1,1,-1,0,0,0,-1,-1,-1,0,-5,-104,-24,-20,-32,27,-31,50,-36,2,-17,-5,-103,-23,-21,-32,27,-31,49,-37,1,-17,-1,0,1,1,1,0,-1,0,0,-1,0,33,33,33,33,33,33,33,33,33,33,33,33,5.6962025316,6.8093385214,6.8863748155,5.6600632595,7.7103586993,10.090817356,11.737089202,9.3818059977,7.0945945946,6.1234903895,11.075949367,10.051880674,12.46105919,13.650740802,12.068387529,10.763538513,10.731052985,12.732450997,7.7702702703,13.607756421,-5.379746835,-3.242542153,-5.574684374,-7.990677543,-4.35802883,-0.672721157,1.0060362173,-3.350644999,-0.675675676,-7.484266032,0.3164556962,0.3242542153,-0.32792261,0,0,0,-0.335345406,-0.3350645,-0.337837838,0,-32.91139241,-7.782101167,-6.558452205,-10.65423672,9.051290647,-10.42717793,16.767270288,-12.062322,0.6756756757,-5.783296479,-32.59493671,-7.457846952,-6.886374816,-10.65423672,9.051290647,-10.42717793,16.431924883,-12.3973865,0.3378378378,-5.783296479 +050,4,9,06,093,California,Siskiyou County,44900,44899,44941,44622,44091,43550,43357,43275,43402,43647,43624,43663,43245,42,-319,-531,-541,-193,-82,127,245,-23,39,-418,93,466,498,454,461,439,468,453,440,398,383,108,540,530,578,513,584,617,636,504,527,607,-15,-74,-32,-124,-52,-145,-149,-183,-64,-129,-224,6,15,15,12,18,21,15,11,6,0,5,51,-258,-524,-434,-150,48,264,417,38,170,-198,57,-243,-509,-422,-132,69,279,428,44,170,-193,0,-2,10,5,-9,-6,-3,0,-3,-2,-1,474,517,594,587,581,578,558,575,567,573,615,596,10.406082869,11.227215853,10.360447736,10.609041849,10.13482316,10.798712461,10.407931165,10.083532903,9.119341941,8.8139181663,12.058550964,11.948643378,13.190173549,11.805723359,13.482316003,14.236764078,14.612459649,11.550228598,12.07510855,13.968794587,-1.652468095,-0.721427525,-2.829725813,-1.19668151,-3.347492843,-3.438051617,-4.204528484,-1.466695695,-2.955766609,-5.154876421,0.334959749,0.3381691522,0.2738444335,0.4142359073,0.4848093083,0.3461125789,0.2527312203,0.1375027214,0,0.1150642058,-5.761307683,-11.81337572,-9.904040346,-3.451965895,1.1081355619,6.0915813884,9.5808108077,0.8708505689,3.8951963064,-4.556542551,-5.426347934,-11.47520656,-9.630195913,-3.037729987,1.5929448703,6.4376939673,9.8335420281,1.0083532903,3.8951963064,-4.441478345 +050,4,9,06,095,California,Solano County,413344,413343,413963,416325,419645,423634,428971,433378,438834,443554,445931,447434,446935,620,2362,3320,3989,5337,4407,5456,4720,2377,1503,-499,1190,5171,5066,5144,5255,5282,5175,5206,5103,5022,5023,643,2874,2920,2961,3035,3173,3224,3377,3534,3680,3953,547,2297,2146,2183,2220,2109,1951,1829,1569,1342,1070,204,748,1146,955,885,931,818,592,268,88,102,-82,-674,126,917,2253,1409,2690,2298,550,59,-1690,122,74,1272,1872,3138,2340,3508,2890,818,147,-1588,-49,-9,-98,-66,-21,-42,-3,1,-10,14,19,12452,12403,12358,11869,11497,11257,11118,11323,11856,11414,11544,11825,12.45591891,12.120052155,12.199995494,12.326927475,12.250260625,11.866381109,11.799797821,11.474055212,11.242885047,11.232500232,6.9228990423,6.9858966231,7.0225868307,7.1193577331,7.3589695123,7.3926981055,7.6542292053,7.946171099,8.2385139333,8.839751825,5.5330198678,5.1341555319,5.1774086631,5.2075697421,4.891291113,4.4736830037,4.1455686161,3.5278841127,3.0043711137,2.392748407,1.8017844411,2.7417251815,2.2649680592,2.0759906404,2.1592185994,1.8756907724,1.3418133519,0.6025958841,0.1970079419,0.2280937734,-1.623533039,0.3014462241,2.1748436757,5.2849795626,3.2678184818,6.1682251563,5.2085930452,1.2366706577,0.1320848701,-3.779200755,0.1782514019,3.0431714057,4.4398117349,7.3609702031,5.4270370813,8.0439159287,6.5504063972,1.8392665419,0.329092812,-3.551106982 +050,4,9,06,097,California,Sonoma County,483878,483866,484675,487231,489784,493870,498317,500598,502445,502203,497221,492318,489819,809,2556,2553,4086,4447,2281,1847,-242,-4982,-4903,-2499,1421,5310,5043,5066,4996,5066,5143,4779,4512,4465,4353,953,3869,3853,3911,3995,4034,4116,4285,4187,4200,4751,468,1441,1190,1155,1001,1032,1027,494,325,265,-398,62,83,123,385,605,627,705,363,83,-112,-53,312,1049,1314,2568,2846,689,146,-1070,-5398,-5053,-2058,374,1132,1437,2953,3451,1316,851,-707,-5315,-5165,-2111,-33,-17,-74,-22,-5,-67,-31,-29,8,-3,10,10043,10235,10424,10788,10841,10915,10635,10629,10686,10739,10729,10527,10.926982651,10.323280605,10.300369845,10.07068224,10.143005161,10.25479466,9.5137799508,9.0292008197,9.0244042933,8.8643437728,7.961675306,7.8872893456,7.951983116,8.052917444,8.0767632882,8.2070260198,8.5303509289,8.3788262039,8.4888013509,9.6748213335,2.9653073445,2.4359912591,2.3483867295,2.0177647964,2.0662418724,2.04776864,0.9834290219,0.6503746158,0.5356029424,-0.810477561,0.1707984105,0.2517873318,0.7827955765,1.2195281736,1.2553620678,1.4057223868,0.7226411639,0.1660956711,-0.226368036,-0.107927916,2.1586449718,2.6898256424,5.221348157,5.7368217886,1.379496754,0.2911141397,-2.130099298,-10.80222208,-10.21283648,-4.190861356,2.3294433824,2.9416129742,6.0041437335,6.9563499623,2.6348588218,1.6968365265,-1.407458135,-10.63612641,-10.43920452,-4.298789273 +050,4,9,06,099,California,Stanislaus County,514453,514451,515137,517515,520336,523313,527814,532954,538986,544494,547855,549761,550081,686,2378,2821,2977,4501,5140,6032,5508,3361,1906,320,1922,7788,7696,7505,7496,7673,7766,7764,7355,7393,7335,909,3672,3811,3854,3929,4118,4272,4391,4368,4529,4676,1013,4116,3885,3651,3567,3555,3494,3373,2987,2864,2659,108,544,256,544,527,761,854,518,156,-116,-58,-416,-2282,-1287,-1192,502,882,1718,1650,234,-861,-2313,-308,-1738,-1031,-648,1029,1643,2572,2168,390,-977,-2371,-19,0,-33,-26,-95,-58,-34,-33,-16,19,32,6305,6330,6346,6439,6397,6311,6477,6415,6577,6459,6512,6536,15.083493762,14.830645247,14.382230041,14.262786514,14.466876829,14.489616956,14.331598184,13.466392151,13.471013542,13.338279498,7.1117859647,7.3440214443,7.3856248605,7.475785514,7.7641859483,7.9705953691,8.1053641968,7.9974440403,8.2524307226,8.5030395275,7.971707797,7.4866238025,6.9966051805,6.7870009999,6.7026908806,6.519021587,6.2262339868,5.4689481109,5.2185828195,4.8352399708,1.0535979207,0.4933270768,1.0424960882,1.0027332568,1.4348094965,1.5933727634,0.9561782405,0.2856230014,-0.211367181,-0.105469695,-4.419688336,-2.480124796,-2.284292899,0.9551652655,1.6629460919,3.2054032875,3.0457414996,0.4284345022,-1.568854681,-4.206058688,-3.366090416,-1.98679772,-1.241796811,1.9578985223,3.0977555884,4.7987760509,4.0019197401,0.7140575036,-1.780221863,-4.311528383 +050,4,9,06,101,California,Sutter County,94737,94751,94742,94466,94153,94457,94721,95224,95769,96161,96348,96910,96385,-9,-276,-313,304,264,503,545,392,187,562,-525,325,1336,1320,1227,1295,1307,1407,1267,1322,1206,1244,220,732,728,736,733,796,818,864,838,866,899,105,604,592,491,562,511,589,403,484,340,345,76,275,265,209,260,289,269,188,79,23,31,-199,-1160,-1206,-395,-565,-289,-312,-195,-373,197,-898,-123,-885,-941,-186,-305,0,-43,-7,-294,220,-867,9,5,36,-1,7,-8,-1,-4,-3,2,-3,1060,1060,1061,754,803,801,841,734,728,753,729,736,14.122024439,13.996469073,13.010975028,13.690809714,13.761878438,14.733524265,13.202730162,13.734422806,12.480725248,12.871517628,7.7375163841,7.7192647612,7.8044642384,7.7493154595,8.3813735555,8.5657589545,9.0032824467,8.7060864687,8.9621128233,9.3018443312,6.3845080546,6.2772043113,5.2065107895,5.9414942541,5.380504883,6.1677653108,4.1994477153,5.0283363375,3.5186124248,3.5696732973,2.9068538328,2.8098972002,2.2162133503,2.7487339966,3.0429861276,2.8168571623,1.9590475694,0.8207408485,0.2380237817,0.3207532528,-12.26163799,-12.78768311,-4.188537193,-5.973210416,-3.042986128,-3.267135445,-2.03199083,-3.8751435,2.0387254344,-9.291497452,-9.354784153,-9.977785907,-1.972323843,-3.224476419,0,-0.450278282,-0.072943261,-3.054402651,2.2767492161,-8.970744199 +050,4,9,06,103,California,Tehama County,63463,63441,63562,63337,63213,62878,62797,63150,63468,63827,63904,65186,64494,121,-225,-124,-335,-81,353,318,359,77,1282,-692,182,732,722,730,806,818,840,728,716,782,765,165,618,604,691,634,612,621,622,689,712,735,17,114,118,39,172,206,219,106,27,70,30,13,25,-16,-16,-27,-25,-20,-28,-38,-48,-30,94,-363,-217,-355,-220,179,124,285,93,1263,-691,107,-338,-233,-371,-247,154,104,257,55,1215,-721,-3,-1,-9,-3,-6,-7,-5,-4,-5,-3,-1,842,844,849,851,851,846,845,846,842,841,844,795,11.536733938,11.41050968,11.57893902,12.826735628,12.98959086,13.268255698,11.43799835,11.211060745,12.115578279,11.798272671,9.7400294723,9.5456341367,10.960338168,10.08951661,9.7183736016,9.8090318912,9.7725755136,10.788297281,11.031063599,11.335595312,1.7967044658,1.8648755433,0.6186008518,2.7372190173,3.2712172581,3.459223807,1.6654228367,0.4227634638,1.0845146797,0.4626773597,0.3940141372,-0.25286448,-0.253784965,-0.429679729,-0.396992386,-0.31591085,-0.439923013,-0.595000431,-0.743667209,-0.46267736,-5.721085273,-3.429474516,-5.630853907,-3.501094092,2.8424654815,1.9586472697,4.4777878157,1.4561852643,19.567743435,-10.65700185,-5.327071135,-3.682338996,-5.884638872,-3.930773821,2.4454730958,1.6427364198,4.0378648022,0.8611848338,18.824076226,-11.11967921 +050,4,9,06,105,California,Trinity County,13786,13782,13755,13685,13494,13427,13126,13094,12827,12727,12598,12337,12216,-27,-70,-191,-67,-301,-32,-267,-100,-129,-261,-121,36,111,116,115,110,101,104,123,115,102,96,53,161,146,157,164,153,182,156,137,172,180,-17,-50,-30,-42,-54,-52,-78,-33,-22,-70,-84,0,0,0,-2,-2,-2,0,1,2,1,3,-7,-20,-159,-21,-249,21,-189,-67,-108,-190,-40,-7,-20,-159,-23,-251,19,-189,-66,-106,-189,-37,-3,0,-2,-2,4,1,0,-1,-1,-2,0,385,385,386,386,385,390,385,385,385,384,385,375,8.0903790087,8.5360020604,8.5435162141,8.2853161601,7.7040427155,8.0243817754,9.6266729279,9.081934847,8.1812713054,7.8198183521,11.734693878,10.7435888,11.663756918,12.352653184,11.670480549,14.042668107,12.209438835,10.81934847,13.79586926,14.66215941,-3.644314869,-2.20758674,-3.120240704,-4.067337024,-3.966437834,-6.018286332,-2.582765907,-1.737413623,-5.614597955,-6.842341058,0,0,-0.148582891,-0.150642112,-0.152555301,0,0.0782656336,0.157946693,0.0802085422,0.2443693235,-1.457725948,-11.70020972,-1.560120352,-18.75494294,1.6018306636,-14.58277073,-5.243797449,-8.529121422,-15.23962302,-3.258257647,-1.457725948,-11.70020972,-1.708703243,-18.90558506,1.4492753623,-14.58277073,-5.165531815,-8.371174729,-15.15941448,-3.013888323 +050,4,9,06,107,California,Tulare County,442179,442176,442953,446709,449625,452259,454858,456794,458991,462072,464279,465751,468680,777,3756,2916,2634,2599,1936,2197,3081,2207,1472,2929,1855,8150,8021,7767,7582,7507,7330,7160,6858,6972,6787,648,2849,2810,2828,2834,2983,3050,3026,3151,3239,3404,1207,5301,5211,4939,4748,4524,4280,4134,3707,3733,3383,-121,-417,-417,-159,42,234,514,26,-276,-446,-291,-302,-1119,-1862,-2134,-2186,-2820,-2596,-1071,-1226,-1837,-194,-423,-1536,-2279,-2293,-2144,-2586,-2082,-1045,-1502,-2283,-485,-7,-9,-16,-12,-5,-2,-1,-8,2,22,31,4775,4772,4733,4981,5045,5067,5113,4990,5016,5062,4928,4977,18.321564819,17.897346302,17.223944543,16.716696964,16.469003523,16.008124178,15.547253554,14.80648264,14.99306474,14.526487242,6.40467953,6.26998418,6.2713164886,6.2483670794,6.5441637818,6.6609520794,6.5706688902,6.8030368618,6.9653667086,7.2857171905,11.916885289,11.627362122,10.952628054,10.468329885,9.9248397415,9.3471720983,8.9765846636,8.0034457781,8.0276980312,7.2407700515,-0.937434666,-0.930456727,-0.352595234,0.0926010647,0.5133537797,1.1225342193,0.0564565073,-0.59588644,-0.959108846,-0.622838926,-2.51556209,-4.154701261,-4.732315908,-4.819664938,-6.186571192,-5.669452983,-2.325573821,-2.646944841,-3.950410202,-0.41522595,-3.452996756,-5.085157988,-5.084911142,-4.727063874,-5.673217412,-4.546918764,-2.269117313,-3.242831281,-4.909519048,-1.038064876 +050,4,9,06,109,California,Tuolumne County,55365,55344,55164,54808,54201,53975,53830,53599,53729,53953,54250,54290,54515,-180,-356,-607,-226,-145,-231,130,224,297,40,225,131,442,462,460,461,472,443,473,461,465,457,119,607,624,600,679,637,684,713,664,682,679,12,-165,-162,-140,-218,-165,-241,-240,-203,-217,-222,8,43,38,52,55,34,29,22,16,13,13,-210,-232,-491,-131,28,-93,343,444,487,245,438,-202,-189,-453,-79,83,-59,372,466,503,258,451,10,-2,8,-7,-10,-7,-1,-2,-3,-1,-4,4482,4416,4341,4088,3843,3853,3513,3601,3553,3587,3519,3941,8.038409777,8.4763643369,8.5046590741,8.552479013,8.7871989872,8.2550685748,8.7851265764,8.5210206741,8.5682697623,8.4003492487,11.039173608,11.448595987,11.093033575,12.596818329,11.858995243,12.745974955,13.242696087,12.273227175,12.566795651,12.48104407,-3.000763831,-2.972231651,-2.588374501,-4.044339316,-3.071796256,-4.49090638,-4.45756951,-3.752206501,-3.998525889,-4.080694821,0.7820172408,0.6971901403,0.9613962432,1.0203608367,0.6329761982,0.540399523,0.4086105384,0.2957404139,0.2395430256,0.2389596066,-4.219255811,-9.008430497,-2.421978997,0.519456426,-1.731376072,6.3916219439,8.2465035939,9.0015988466,4.5144647135,8.0511005928,-3.43723857,-8.311240356,-1.460582754,1.5398172627,-1.098399873,6.9320214669,8.6551141324,9.2973392605,4.7540077391,8.2900601994 +050,4,9,06,111,California,Ventura County,823318,823446,825144,829908,833287,837729,842113,845599,846921,848264,847222,844203,841387,1698,4764,3379,4442,4384,3486,1322,1343,-1042,-3019,-2816,2768,11007,10528,10531,10332,10315,9928,9454,9215,8859,8820,1266,5081,5010,5361,5335,5625,5633,5783,6011,5993,6741,1502,5926,5518,5170,4997,4690,4295,3671,3204,2866,2079,119,443,512,1000,1228,1383,1086,436,-175,-446,-320,172,-1591,-2604,-1651,-1717,-2520,-4044,-2744,-4073,-5456,-4601,291,-1148,-2092,-651,-489,-1137,-2958,-2308,-4248,-5902,-4921,-95,-14,-47,-77,-124,-67,-15,-20,2,17,26,10702,10689,10436,10594,10695,10632,10967,11120,11272,11470,11219,11350,13.301092654,12.659970719,12.604307798,12.301156895,12.223649533,11.731619124,11.15394485,10.870039623,10.475191037,10.465178365,6.1399883508,6.0245491358,6.4164556174,6.3517878467,6.665829241,6.6563467492,6.8228541428,7.0905923139,7.0863325303,7.9983863217,7.1611043037,6.6354215832,6.1878521809,5.9493690478,5.5578202916,5.0752723749,4.3310907069,3.7794473089,3.3888585069,2.4667920431,0.535330612,0.6156824666,1.1968766307,1.4620422635,1.6389052161,1.2832935504,0.5143981335,-0.206430487,-0.527365978,-0.379689011,-1.922598202,-3.131322545,-1.976043317,-2.044239875,-2.9862915,-4.778673221,-3.237404767,-4.804522125,-6.451364973,-5.459216061,-1.38726759,-2.515640078,-0.779166687,-0.582197611,-1.347386284,-3.495379671,-2.723006633,-5.010952612,-6.978730952,-5.838905072 +050,4,9,06,113,California,Yolo County,200849,200855,201061,201931,204558,206267,208368,211998,215569,218470,220082,220019,219728,206,870,2627,1709,2101,3630,3571,2901,1612,-63,-291,565,2426,2319,2506,2472,2409,2393,2318,2265,2074,2068,223,1225,1171,1285,1176,1299,1280,1368,1397,1341,1489,342,1201,1148,1221,1296,1110,1113,950,868,733,579,158,815,806,1068,1151,1473,1351,1198,865,550,435,-303,-1152,690,-563,-328,1052,1106,752,-121,-1355,-1317,-145,-337,1496,505,823,2525,2457,1950,744,-805,-882,9,6,-17,-17,-18,-5,1,1,0,9,12,6709,6735,6752,7657,7867,7232,7815,9139,9791,10163,10379,10093,12.03994124,11.409902851,12.199841782,11.923740157,11.461440744,11.193567324,10.68106783,10.329447819,9.4251092363,9.4054081097,6.0795251519,5.7615335224,6.2557049839,5.6724589096,6.1803285708,5.9873657228,6.3035810146,6.3709662708,6.0940556827,6.7720757617,5.9604160877,5.6483693286,5.9441367979,6.2512812474,5.2811121737,5.2062016012,4.3774868157,3.9584815484,3.3310535536,2.6333323479,4.0447453051,3.9656669676,5.1992941033,5.5518709226,7.0081785872,6.3194774152,5.5202412686,3.9448001605,2.4994262681,1.9784103132,-5.717235082,3.394925816,-2.740826386,-1.58211439,5.0051621682,5.1734581949,3.4651264057,-0.551815976,-6.157677442,-5.989807776,-1.672489776,7.3605927836,2.4584677174,3.9697565329,12.013340755,11.49293561,8.9853676743,3.3929841843,-3.658251174,-4.011397463 +050,4,9,06,115,California,Yuba County,72155,72142,72345,72480,72770,73082,73527,74039,74920,76575,77418,78549,80160,203,135,290,312,445,512,881,1655,843,1131,1611,283,1251,1219,1229,1199,1196,1171,1219,1137,1150,1138,96,558,537,589,584,596,622,676,697,624,604,187,693,682,640,615,600,549,543,440,526,534,44,46,151,123,108,131,87,26,-27,-9,1,-23,-606,-541,-445,-261,-214,246,1081,431,611,1081,21,-560,-390,-322,-153,-83,333,1107,404,602,1082,-5,2,-2,-6,-17,-5,-1,5,-1,3,-5,1171,1168,1169,1159,1186,1184,1236,1280,1308,1138,1112,1193,17.276022786,16.784853701,16.852699997,16.356431051,16.209696,15.722447116,16.092940361,14.766904989,14.74670924,14.340711617,7.7058518902,7.3941480207,8.0766804706,7.9667687523,8.0777414852,8.3512912949,8.9243869435,9.0523595228,8.0016926658,7.6114146016,9.5701708959,9.3907056799,8.7760195266,8.389662299,8.1319545153,7.3711558214,7.1685534176,5.7145454664,6.745016574,6.7292970153,0.635249439,2.0791738382,1.6866412528,1.4733065501,1.7754767358,1.1681066602,0.3432456517,-0.35066529,-0.115409029,0.0126016798,-8.36872087,-7.449225473,-6.102076077,-3.560490829,-2.90039711,3.3029222806,14.271098056,5.5976570364,7.8349907352,13.622415868,-7.733471431,-5.370051635,-4.415434824,-2.087184279,-1.124920375,4.4710289408,14.614343708,5.2469917464,7.7195817064,13.635017548 +040,4,8,08,000,Colorado,Colorado,5029196,5029319,5047539,5121900,5193660,5270774,5352637,5454328,5543844,5617421,5697155,5758486,5807719,18220,74361,71760,77114,81863,101691,89516,73577,79734,61331,49233,16787,65940,64738,64732,65706,66346,66592,65316,63793,63145,63285,7830,32010,32715,33583,33932,36243,36713,37693,38169,39290,42735,8957,33930,32023,31149,31774,30103,29879,27623,25624,23855,20550,2532,13093,11747,9510,10182,13926,10146,8839,11306,3576,3118,6067,27111,27240,35625,38973,56922,49212,36903,42580,33815,25498,8599,40204,38987,45135,49155,70848,59358,45742,53886,37391,28616,664,227,750,830,934,740,279,212,224,85,67,116006,116055,117075,115364,116079,117583,119112,119583,120592,119189,120692,117920,12.968266981,12.551524105,12.371811032,12.370038211,12.278377879,12.109648767,11.704049675,11.276251094,11.024263068,10.943088074,6.2953325154,6.3428451776,6.4185029023,6.3881553674,6.7073410527,6.6762003722,6.7542523182,6.746872353,6.8595026677,7.3896321222,6.6729344657,6.2086789278,5.9533081292,5.9818828435,5.5710368267,5.4334483949,4.9497973572,4.5293787412,4.1647604006,3.5534559521,2.5749699664,2.2775302553,1.8175851651,1.9168984425,2.5772268162,1.8450338838,1.5838706455,1.9984840793,0.6243212405,0.5391569664,5.331857539,5.2813419727,6.8087772353,7.3371914162,10.534317452,8.9491235453,6.6126913034,7.5265745707,5.903641708,4.4090520616,7.9068275054,7.558872228,8.6263624005,9.2540898587,13.111544268,10.794157429,8.1965619488,9.52505865,6.5279629486,4.9482090279 +050,4,8,08,001,Colorado,Adams County,441603,441701,443692,452209,460568,469995,479954,490448,497735,503717,511485,516575,519883,1991,8517,8359,9427,9959,10494,7287,5982,7768,5090,3308,1808,7290,6924,7171,7037,7368,7155,7178,6928,6825,6565,668,2468,2730,2796,2678,2943,2966,3073,3106,3262,3458,1140,4822,4194,4375,4359,4425,4189,4105,3822,3563,3107,102,1308,650,611,614,1036,770,868,1260,330,312,700,2381,3441,4354,4860,4981,2315,1005,2658,1176,-138,802,3689,4091,4965,5474,6017,3085,1873,3918,1506,174,49,6,74,87,126,52,13,4,28,21,27,4027,4031,4032,4036,4042,4038,4032,4040,4039,4038,4034,4035,16.274119573,15.171284991,15.41217521,14.815532202,15.185459222,14.481123436,14.335185311,13.648515271,13.277435169,12.668144778,5.5095373261,5.9817458152,6.0092653587,5.638197419,6.0655274824,6.002936703,6.1370889468,6.118979277,6.3459331167,6.6727257641,10.764582247,9.1895391755,9.4029098513,9.1773347832,9.1199317396,8.4781867326,8.1980963641,7.5295359938,6.9315020524,5.9954190136,2.9199654873,1.4242251941,1.3131835244,1.2927009766,2.1351975779,1.5584157995,1.7334829827,2.4822646133,0.6419858763,0.6020504449,5.3153194382,7.539629066,9.3577758841,10.232128251,10.265848586,4.6853669816,2.0070857115,5.2363963034,2.2878042138,-0.266291543,8.2352849255,8.9638542601,10.670959408,11.524829228,12.401046164,6.2437827811,3.7405686943,7.7186609167,2.9297900901,0.335758902 +050,4,8,08,003,Colorado,Alamosa County,15445,15440,15515,15715,15685,15794,15807,15894,16047,16102,16235,16200,16180,75,200,-30,109,13,87,153,55,133,-35,-20,75,234,208,222,236,213,198,200,200,189,191,15,132,123,147,127,134,146,158,140,132,127,60,102,85,75,109,79,52,42,60,57,64,3,13,0,-1,1,2,4,3,12,-12,-3,11,85,-117,35,-95,8,97,11,61,-79,-82,14,98,-117,34,-94,10,101,14,73,-91,-85,1,0,2,0,-2,-2,0,-1,0,-1,1,740,740,740,740,740,861,856,857,855,852,853,852,14.985590778,13.248407643,14.104641189,14.936236195,13.438061891,12.397858552,12.442066627,12.369731268,11.654077386,11.797405806,8.4534101825,7.8343949045,9.3395597065,8.0377203253,8.4539919876,9.1418552957,9.8292326355,8.6588118873,8.1393556343,7.8443483632,6.5321805956,5.4140127389,4.7650814829,6.8985158698,4.9840699032,3.256003256,2.6128339917,3.7109193803,3.5147217512,3.9530574429,0.832532821,0,-0.06353442,0.0632891364,0.1261789849,0.2504617889,0.1866309994,0.7421838761,-0.739941421,-0.185299568,5.4434838297,-7.452229299,2.223704692,-6.01246796,0.5047159396,6.0736983814,0.6843136645,3.7727680366,-4.871281024,-5.064854849,6.2760166507,-7.452229299,2.1601702722,-5.949178823,0.6308949245,6.3241601703,0.8709446639,4.5149519127,-5.611222445,-5.250154416 +050,4,8,08,005,Colorado,Arapahoe County,572003,572477,575124,586433,597052,609089,619681,631688,639605,645080,652395,656051,657452,2647,11309,10619,12037,10592,12007,7917,5475,7315,3656,1401,2035,7703,7714,7856,7904,8132,8089,7878,7659,7578,7501,884,3423,3373,3571,3485,3741,3904,3979,3974,4151,4531,1151,4280,4341,4285,4419,4391,4185,3899,3685,3427,2970,602,2850,2597,2382,2473,3095,2342,2005,2456,1013,779,873,4161,3665,5286,3688,4504,1389,-411,1164,-808,-2392,1475,7011,6262,7668,6161,7599,3731,1594,3620,205,-1613,21,18,16,84,12,17,1,-18,10,24,44,5025,5024,5060,5101,5112,5077,5058,5062,5059,5055,5063,5061,13.263232024,13.036075658,13.026669353,12.864897418,12.996965723,12.725626586,12.264485068,11.806007823,11.583206338,11.421367138,5.8938132179,5.7001144924,5.921364086,5.6723390057,5.9790517425,6.1417784885,6.1945146086,6.125744234,6.3449313155,6.8991087192,7.369418806,7.3359611655,7.105305267,7.1925584121,7.0179139806,6.583848098,6.0699704597,5.6802635889,5.2382750224,4.5222584189,4.9072064479,4.388733275,3.9497869652,4.0251633748,4.9465825028,3.6844378125,3.1213877332,3.7858147556,1.5484016918,1.1861411813,7.1645214139,6.1935723731,8.7651443737,6.0027507182,7.1985161851,2.1851768239,-0.639845565,1.7942542246,-1.23505288,-3.64216907,12.071727862,10.582305648,12.714931339,10.027914093,12.145098688,5.8696146364,2.4815421679,5.5800689801,0.3133488123,-2.456027889 +050,4,8,08,007,Colorado,Archuleta County,12084,12084,12048,12027,12141,12225,12240,12399,12834,13312,13670,13928,14196,-36,-21,114,84,15,159,435,478,358,258,268,23,138,116,103,106,121,117,137,119,105,109,27,80,74,92,93,104,90,107,106,86,103,-4,58,42,11,13,17,27,30,13,19,6,2,10,7,12,6,7,3,8,11,3,6,-35,-90,63,59,-3,134,401,438,332,235,259,-33,-80,70,71,3,141,404,446,343,238,265,1,1,2,2,-1,1,4,2,2,1,-3,129,129,129,129,129,129,129,129,129,129,129,129,11.464174455,9.599470374,8.4544036773,8.6654404251,9.8218271845,9.2735703246,10.479614473,8.8206952783,7.6092470469,7.751386716,6.6458982347,6.1238000662,7.5515061972,7.6026977315,8.4419010512,7.1335156343,8.1848083837,7.8570899118,6.2323356765,7.3247048784,4.8182762201,3.4756703078,0.9028974801,1.0627426936,1.3799261334,2.1400546903,2.2948060889,0.9636053665,1.3769113704,0.4266818376,0.8307372793,0.5792783846,0.9849790692,0.4904966278,0.5682048784,0.2377838545,0.6119482904,0.8153583871,0.2174070585,0.4266818376,-7.476635514,5.2135054618,4.8428137569,-0.245248314,10.877064816,31.783775215,33.504168898,24.608998592,17.030219581,18.418432655,-6.645898235,5.7927838464,5.8277928261,0.2452483139,11.445269694,32.021559069,34.116117188,25.424356979,17.24762664,18.845114493 +050,4,8,08,009,Colorado,Baca County,3788,3787,3807,3779,3722,3656,3586,3554,3534,3554,3587,3620,3555,20,-28,-57,-66,-70,-32,-20,20,33,33,-65,13,39,54,46,36,31,38,38,37,47,39,7,74,71,54,49,56,62,45,61,36,49,6,-35,-17,-8,-13,-25,-24,-7,-24,11,-10,0,1,1,1,0,1,1,3,3,2,1,15,6,-40,-60,-59,-8,3,24,54,20,-56,15,7,-39,-59,-59,-7,4,27,57,22,-55,-1,0,-1,1,2,0,0,0,0,0,0,82,82,82,82,82,82,82,82,82,82,82,82,10.282098603,14.398080256,12.469503931,9.942004971,8.6834733894,10.72234763,10.72234763,10.362694301,13.042874983,10.871080139,19.50962299,18.930809225,14.63811331,13.532173433,15.68627451,17.494356659,12.69751693,17.084441955,9.9902872208,13.658536585,-9.227524387,-4.532728969,-2.168609379,-3.590168462,-7.00280112,-6.772009029,-1.9751693,-6.721747654,3.0525877619,-2.787456446,0.2636435539,0.2666311159,0.2710761724,0,0.2801120448,0.2821670429,0.8465011287,0.8402184568,0.5550159567,0.2787456446,1.5818613235,-10.66524463,-16.26457034,-16.29384148,-2.240896359,0.8465011287,6.7720090293,15.123932222,5.5501595671,-15.6097561,1.8455048774,-10.39861352,-15.99349417,-16.29384148,-1.960784314,1.1286681716,7.618510158,15.964150679,6.1051755238,-15.33101045 +050,4,8,08,011,Colorado,Bent County,6499,6499,6500,6424,5850,5759,5821,5891,5832,5828,5793,5578,5356,1,-76,-574,-91,62,70,-59,-4,-35,-215,-222,13,42,57,36,30,41,34,41,30,45,41,25,61,57,61,49,55,61,70,84,50,54,-12,-19,0,-25,-19,-14,-27,-29,-54,-5,-13,2,19,13,11,0,1,2,1,1,0,1,11,-77,-619,-77,77,81,-34,25,18,-211,-208,13,-58,-606,-66,77,82,-32,26,19,-211,-207,0,1,32,0,4,2,0,-1,0,1,-2,2208,2209,2212,1715,1737,1923,1937,1938,1936,1903,1694,1518,6.4995357474,9.2879256966,6.2020845895,5.1813471503,7.0013661202,5.8005629958,7.0325900515,5.1630668617,7.9148711635,7.4995427108,9.4398019189,9.2879256966,10.509087777,8.4628670121,9.3920765027,10.406892434,12.006861063,14.456587213,8.7943012928,9.8774464972,-2.940266171,0,-4.307003187,-3.281519862,-2.390710383,-4.606329438,-4.974271012,-9.293520351,-0.879430129,-2.377903786,2.9402661715,2.1182988431,1.8950814024,0,0.1707650273,0.341209588,0.1715265866,0.1721022287,0,0.1829156759,-11.91581554,-100.8636141,-13.26556982,13.298791019,13.831967213,-5.800562996,4.2881646655,3.097840117,-37.11195146,-38.04646058,-8.975549366,-98.7453153,-11.37048841,13.298791019,14.00273224,-5.459353408,4.4596912521,3.2699423458,-37.11195146,-37.86354491 +050,4,8,08,013,Colorado,Boulder County,294567,294560,295056,300045,304717,309538,312525,318408,321761,323019,325438,326020,327171,496,4989,4672,4821,2987,5883,3353,1258,2419,582,1151,766,2998,2962,2961,2942,2868,2832,2637,2581,2554,2517,346,1507,1580,1666,1705,1793,1817,1792,1844,1989,2164,420,1491,1382,1295,1237,1075,1015,845,737,565,353,244,1072,862,780,1017,1264,1053,845,1038,336,289,-163,2414,2401,2716,787,3504,1289,-423,650,-331,485,81,3486,3263,3496,1804,4768,2342,422,1688,5,774,-5,12,27,30,-54,40,-4,-9,-6,12,24,8949,8950,9563,9428,9751,9928,10274,10193,10278,10337,9931,10463,10.075600612,9.7955890086,9.6409471636,9.4588490233,9.0912981252,8.8476636638,8.1795341047,7.9604353103,7.8408738553,7.7067810181,5.0646864986,5.2251960275,5.4244572694,5.4817598861,5.6836462826,5.6766260159,5.5584850647,5.6873470407,6.1063030924,6.6259333028,5.0109141137,4.570392981,4.2164898943,3.9770891373,3.4076518426,3.1710376479,2.62104904,2.2730882695,1.7345707628,1.0808477153,3.6027497853,2.8507082125,2.5396618668,3.269765281,4.0067645851,3.2897562987,2.62104904,3.2014458939,1.0315323474,0.8848866564,8.1129085651,7.9403137102,8.8432328593,2.5302903404,11.107360052,4.027061604,-1.312075437,2.0047589894,-1.016182164,1.4850173992,11.71565835,10.791021923,11.382894726,5.8000556214,15.114124638,7.3168179028,1.3089736034,5.2062048833,0.0153501837,2.3699040556 +050,4,8,08,014,Colorado,Broomfield County,55889,55848,56212,57485,58971,60158,61791,64914,66596,68340,69431,70617,72236,364,1273,1486,1187,1633,3123,1682,1744,1091,1186,1619,161,679,678,677,700,674,740,671,633,676,672,91,318,326,328,351,366,378,355,387,389,445,70,361,352,349,349,308,362,316,246,287,227,28,128,111,98,105,142,108,92,110,42,40,250,778,1003,733,1151,2625,1208,1329,735,854,1355,278,906,1114,831,1256,2767,1316,1421,845,896,1395,16,6,20,7,28,48,4,7,0,3,-3,282,282,282,282,282,282,282,282,282,282,282,282,11.944026667,11.643882668,11.365830318,11.48020894,10.6388856,11.253897042,9.9454556234,9.1891617249,9.6538329716,9.4082728399,5.5938151402,5.5986810469,5.5066356639,5.7565047684,5.7771990056,5.7486122728,5.2617537203,5.6180183057,5.555238204,6.2301806752,6.3502115271,6.0452016212,5.8591946545,5.7237041714,4.8616865948,5.5052847692,4.6837019031,3.5711434192,4.0985947675,3.1780921647,2.251598547,1.9062993749,1.6452752898,1.722031341,2.2414269366,1.6424606494,1.3636094148,1.5968527484,0.5997943562,0.5600162405,13.685497419,17.225389847,12.305987627,18.876743557,41.434828933,18.371226523,19.698227308,10.669879728,12.195818576,18.970550146,15.937095966,19.131689222,13.951262917,20.598774898,43.67625587,20.013687172,21.061836723,12.266732476,12.795612933,19.530566386 +050,4,8,08,015,Colorado,Chaffee County,17809,17809,17808,18035,18164,18375,18471,18635,19140,19700,20066,20319,20661,-1,227,129,211,96,164,505,560,366,253,342,30,146,151,111,143,138,135,131,143,122,138,29,155,158,178,169,203,186,178,173,178,191,1,-9,-7,-67,-26,-65,-51,-47,-30,-56,-53,6,23,16,3,0,18,11,10,10,2,5,-7,212,116,273,117,207,542,592,383,309,394,-1,235,132,276,117,225,553,602,393,311,399,-1,1,4,2,5,4,3,5,3,-2,-4,1436,1436,1480,1469,1362,1471,1442,1491,1487,1478,1461,1395,8.1466395112,8.3427718998,6.0756999371,7.7620365847,7.4381501644,7.1475843812,6.745623069,7.1920736307,6.0418472205,6.7349926794,8.6488296181,8.729522915,9.7430143135,9.1733159637,10.941626691,9.8477829252,9.1658084449,8.7009002666,8.8151541414,9.3216203026,-0.502190107,-0.386751015,-3.667314376,-1.411279379,-3.503476527,-2.700198544,-2.420185376,-1.508826636,-2.773306921,-2.586627623,1.2833747175,0.8840023205,0.1642081064,0,0.9701934997,0.5823957644,0.5149330587,0.5029422119,0.0990466757,0.2440214739,11.829366961,6.4090168237,14.942937683,6.3507572057,11.157225247,28.696227664,30.484037075,19.262686717,15.302711403,19.228892143,13.112741679,7.2930191442,15.107145789,6.3507572057,12.127418746,29.278623428,30.998970134,19.765628929,15.401758078,19.472913616 +050,4,8,08,017,Colorado,Cheyenne County,1836,1833,1833,1863,1871,1878,1845,1826,1848,1849,1864,1824,1795,0,30,8,7,-33,-19,22,1,15,-40,-29,4,21,37,27,26,28,27,21,15,14,14,2,21,27,18,14,20,21,20,21,17,14,2,0,10,9,12,8,6,1,-6,-3,0,1,17,1,2,5,7,4,4,4,3,1,-4,13,-2,-4,-51,-35,12,-3,16,-38,-30,-3,30,-1,-2,-46,-28,16,1,20,-35,-29,1,0,-1,0,1,1,0,-1,1,-2,0,42,42,42,42,42,42,42,42,42,42,42,42,11.363636364,19.817889663,14.403841024,13.967230728,15.254698992,14.697876973,11.360562618,8.079719903,7.5921908894,7.7369439072,11.363636364,14.461703267,9.6025606828,7.5208165458,10.896213566,11.43168209,10.819583446,11.311607864,9.2190889371,7.7369439072,0,5.3561863953,4.8012803414,6.4464141821,4.3584854263,3.266194883,0.5409791723,-3.231887961,-1.626898048,0,9.1991341991,0.5356186395,1.066951187,2.6860059092,3.813674748,2.1774632553,2.1639166892,2.1545919741,1.6268980477,0.5526388505,7.0346320346,-1.071237279,-2.133902374,-27.39726027,-19.06837374,6.5323897659,-1.622937517,8.6183678966,-20.60737527,-16.57916552,16.233766234,-0.53561864,-1.066951187,-24.71125436,-15.25469899,8.7098530212,0.5409791723,10.772959871,-18.98047722,-16.02652666 +050,4,8,08,019,Colorado,Clear Creek County,9088,9073,9084,9012,9017,9025,9124,9246,9355,9573,9552,9598,9586,11,-72,5,8,99,122,109,218,-21,46,-12,15,67,65,68,78,59,74,78,81,70,63,32,54,42,57,61,60,55,52,66,74,81,-17,13,23,11,17,-1,19,26,15,-4,-18,4,27,23,22,23,25,15,14,18,10,8,22,-111,-39,-26,59,97,75,177,-54,41,-1,26,-84,-16,-4,82,122,90,191,-36,51,7,2,-1,-2,1,0,1,0,1,0,-1,-1,84,84,84,84,84,84,84,84,84,84,84,84,7.4049513705,7.2106051362,7.537966966,8.5955149044,6.4235166032,7.9565614752,8.2417582418,8.4705882353,7.3107049608,6.5679733111,5.9681697613,4.6591602418,6.3185899568,6.7221334509,6.5323897659,5.9136605559,5.4945054945,6.9019607843,7.72845953,8.4445371143,1.4367816092,2.5514448943,1.2193770092,1.8733814535,-0.108873163,2.0429009193,2.7472527473,1.568627451,-0.417754569,-1.876563803,2.9840848806,2.5514448943,2.4387540184,2.5345749077,2.7218290691,1.6128165152,1.4792899408,1.8823529412,1.044386423,0.834028357,-12.26790451,-4.326363082,-2.88216384,6.5017356328,10.560696788,8.0640825762,18.702451395,-5.647058824,4.2819843342,-0.104253545,-9.283819629,-1.774918187,-0.443409822,9.0363105405,13.282525857,9.6768990914,20.181741336,-3.764705882,5.3263707572,0.7297748123 +050,4,8,08,021,Colorado,Conejos County,8256,8256,8312,8291,8248,8199,8230,8064,8044,8141,8154,8169,8143,56,-21,-43,-49,31,-166,-20,97,13,15,-26,41,106,124,107,126,115,97,95,82,97,97,5,88,84,101,72,93,91,72,94,75,80,36,18,40,6,54,22,6,23,-12,22,17,1,12,5,1,3,2,2,4,4,1,1,19,-51,-87,-58,-26,-192,-29,72,21,-6,-44,20,-39,-82,-57,-23,-190,-27,76,25,-5,-43,0,0,-1,2,0,2,1,-2,0,-2,0,36,36,36,36,36,36,36,36,36,36,36,36,12.768776727,14.994860632,13.011491457,15.338730294,14.115625384,12.043704991,11.739264751,10.064436944,11.885070146,11.893084846,10.600493887,10.157808816,12.281875114,8.7649887394,11.415244875,11.298733549,8.8971269694,11.537281375,9.1894872266,9.8087297695,2.1682828405,4.8370518169,0.7296163434,6.5737415546,2.7003805082,0.7449714428,2.8421377819,-1.472844431,2.6955829198,2.084355076,1.4455218936,0.6046314771,0.1216027239,0.3652078641,0.2454891371,0.2483238143,0.4942848316,0.4909481436,0.1225264964,0.1226091221,-6.143468048,-10.5205877,-7.052957986,-3.165134823,-23.56695716,-3.600695307,8.8971269694,2.5774777539,-0.735158978,-5.394801373,-4.697946154,-9.915956225,-6.931355262,-2.799926958,-23.32146803,-3.352371492,9.3914118011,3.0684258975,-0.612632482,-5.272192251 +050,4,8,08,023,Colorado,Costilla County,3524,3524,3529,3640,3601,3540,3560,3576,3692,3758,3803,3872,3921,5,111,-39,-61,20,16,116,66,45,69,49,7,35,29,28,25,31,30,37,30,36,36,11,35,40,45,43,34,49,37,45,33,29,-4,0,-11,-17,-18,-3,-19,0,-15,3,7,1,17,8,9,8,9,4,9,13,8,7,8,93,-35,-55,30,12,131,57,46,57,37,9,110,-27,-46,38,21,135,66,59,65,44,0,1,-1,2,0,-2,0,0,1,1,-2,0,0,0,0,0,0,0,0,0,0,0,0,9.7642627982,8.009943378,7.8420389301,7.0422535211,8.6883408072,8.2553659879,9.932885906,7.9354582727,9.3811074919,9.2390606955,9.7642627982,11.048197763,12.603276852,12.112676056,9.5291479821,13.483764447,9.932885906,11.903187409,8.5993485342,7.4425766714,0,-3.038254385,-4.761237922,-5.070422535,-0.840807175,-5.228398459,0,-3.967729136,0.7817589577,1.7964840241,4.7426419305,2.2096395525,2.5206553704,2.2535211268,2.5224215247,1.1007154651,2.4161073826,3.4386985848,2.0846905537,1.7964840241,25.945041149,-9.667173042,-15.40400504,8.4507042254,3.3632286996,36.04843148,15.302013423,12.167702685,14.853420195,9.4957012704,30.68768308,-7.45753349,-12.88334967,10.704225352,5.8856502242,37.149146946,17.718120805,15.60640127,16.938110749,11.292185294 +050,4,8,08,025,Colorado,Crowley County,5823,5823,5859,5884,5468,5352,5610,5633,5276,5820,5886,5989,5696,36,25,-416,-116,258,23,-357,544,66,103,-293,12,32,42,39,30,42,27,30,29,32,27,3,35,47,38,46,38,55,46,36,45,48,9,-3,-5,1,-16,4,-28,-16,-7,-13,-21,3,34,15,0,-2,9,11,11,21,-6,5,23,-7,-448,-121,263,10,-345,542,51,122,-276,26,27,-433,-121,261,19,-334,553,72,116,-271,1,1,22,4,13,0,5,7,1,0,-1,2682,2688,2657,2310,2264,2533,2604,2227,2820,2819,2914,2675,5.4500553521,7.399577167,7.2088724584,5.4734537493,7.4713154852,4.9500412503,5.4073540014,4.9547240731,5.3894736842,4.621309371,5.9609980414,8.2804792107,7.0240295749,8.3926290823,6.7597616295,10.083417362,8.2912761355,6.1506919528,7.5789473684,8.215661104,-0.510942689,-0.880902044,0.1848428835,-2.919175333,0.7115538557,-5.133376111,-2.883922134,-1.19596788,-2.189473684,-3.594351733,5.7906838116,2.6427061311,0,-0.364896917,1.6009961754,2.0166834724,1.9826964672,3.5879036392,-1.010526316,0.8557980317,-1.192199608,-78.92882311,-22.36598891,47.983944536,1.7788846393,-63.25052709,97.692862293,8.7134802665,20.547368421,-47.24005135,4.5984842034,-76.28611698,-22.36598891,47.619047619,3.3798808147,-61.23384362,99.67555876,12.301383906,19.536842105,-46.38425332 +050,4,8,08,027,Colorado,Custer County,4255,4251,4278,4224,4217,4260,4339,4434,4581,4861,4962,5119,5183,27,-54,-7,43,79,95,147,280,101,157,64,4,21,26,20,23,25,17,38,33,35,37,4,29,36,36,36,33,52,44,48,35,42,0,-8,-10,-16,-13,-8,-35,-6,-15,0,-5,0,0,0,0,0,0,0,0,0,0,0,25,-45,3,58,90,103,180,283,115,157,71,25,-45,3,58,90,103,180,283,115,157,71,2,-1,0,1,2,0,2,3,1,0,-2,150,150,150,150,150,150,150,150,150,150,150,150,4.9400141143,6.1604075347,4.718650466,5.3494592394,5.6993046848,3.7714919578,8.0491421309,6.718924972,6.9437555798,7.1830712483,6.8219242531,8.529795048,8.4935708387,8.3730666357,7.523082184,11.536328342,9.3200593095,9.7729817775,6.9437555798,8.1537565521,-1.881910139,-2.369387513,-3.774920373,-3.023607396,-1.823777499,-7.764836384,-1.270917179,-3.054056805,0,-0.970685304,0,0,0,0,0,0,0,0,0,0,-10.58574453,0.710816254,13.684086351,20.932666589,23.481135301,39.93344426,59.944926922,23.414435509,31.147703601,13.783731314,-10.58574453,0.710816254,13.684086351,20.932666589,23.481135301,39.93344426,59.944926922,23.414435509,31.147703601,13.783731314 +050,4,8,08,029,Colorado,Delta County,30952,30954,30858,30398,30473,30349,29973,29925,30352,30516,30835,31021,31067,-96,-460,75,-124,-376,-48,427,164,319,186,46,82,342,338,317,295,271,283,278,278,278,268,110,359,317,318,363,378,360,388,440,411,422,-28,-17,21,-1,-68,-107,-77,-110,-162,-133,-154,3,32,14,5,4,-3,-9,-9,-9,-13,-2,-73,-477,48,-130,-312,66,513,283,493,332,205,-70,-445,62,-125,-308,63,504,274,484,319,203,2,2,-8,2,0,-4,0,0,-3,0,-3,713,713,698,713,558,697,702,712,713,713,713,582,11.166253102,11.105452514,10.423859788,9.7808428103,9.0487161508,9.3899829122,9.134520602,9.0626069665,8.9886187274,8.6329081304,11.721300771,10.415468778,10.456742626,12.035409967,12.621456476,11.944854588,12.748899257,14.343694479,13.288929126,13.593609071,-0.555047669,0.6899837361,-0.032882838,-2.254567156,-3.572740325,-2.554871676,-3.614378655,-5.281087513,-4.300310398,-4.960700941,1.0447956119,0.4599891574,0.1644141922,0.1326215974,-0.100170289,-0.298621365,-0.29572189,-0.293393751,-0.420331092,-0.064424688,-15.57398459,1.5771056825,-4.274768998,-10.3444846,2.2037463688,17.021417788,9.2988105408,16.071457678,10.734609415,6.6035304729,-14.52918898,2.0370948399,-4.110354806,-10.211863,2.1035760793,16.722796423,9.0030886509,15.778063927,10.314278324,6.5391057853 +050,4,8,08,031,Colorado,Denver County,600158,599454,603012,620250,634965,649270,664540,683328,696273,704869,716340,725508,735538,3558,17238,14715,14305,15270,18788,12945,8596,11471,9168,10030,2411,9605,9227,9257,9323,9365,9447,8996,8938,8749,9233,1002,4113,4128,4161,4170,4305,4380,4325,4402,4709,5406,1409,5492,5099,5096,5153,5060,5067,4671,4536,4040,3827,412,2702,1963,1782,1934,2607,1855,1652,2220,673,588,1514,8931,7177,7059,7777,10820,5937,2225,4655,4459,5641,1926,11633,9140,8841,9711,13427,7792,3877,6875,5132,6229,223,113,476,368,406,301,86,48,60,-4,-26,15981,15986,16182,16227,16123,16210,16488,16451,16412,16415,16324,16064,15.70391298,14.701863824,14.416364606,14.192310913,13.896019492,13.695264065,12.840954022,12.578023359,12.135814593,12.63889022,6.7246427993,6.5773592572,6.4801224075,6.3479498558,6.3878658741,6.3496619675,6.1735355874,6.1947257581,6.531895179,7.4001776809,8.9792701809,8.1245045669,7.9362421987,7.8443610568,7.5081536174,7.345602098,6.6674184344,6.3832976008,5.6039194145,5.2387125388,4.4176962907,3.1277510227,2.7751930137,2.9441091178,3.8683313203,2.6891833218,2.3580764833,3.1241006777,0.9335241995,0.8049027888,14.601941367,11.435491131,10.993315086,11.838850366,16.054984613,8.6068363244,3.1759807357,6.5507606552,6.1851179875,7.72186502,19.019637657,14.563242154,13.7685081,14.782959484,19.923315933,11.296019646,5.534057219,9.6748613329,7.118642187,8.5267678088 +050,4,8,08,033,Colorado,Dolores County,2064,2064,2069,2044,2009,2033,1976,1980,2055,2044,2056,2042,2096,5,-25,-35,24,-57,4,75,-11,12,-14,54,5,17,24,17,15,19,15,12,15,12,16,0,17,18,18,29,14,15,21,21,18,11,5,0,6,-1,-14,5,0,-9,-6,-6,5,0,0,0,0,0,0,0,0,0,0,0,0,-25,-43,24,-45,0,76,-2,18,-8,48,0,-25,-43,24,-45,0,76,-2,18,-8,48,0,0,2,1,2,-1,-1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,8.2664721614,11.843079201,8.4116773874,7.4831628835,9.6056622851,7.4349442379,5.8550866065,7.3170731707,5.8565153734,7.7332044466,8.2664721614,8.8823094004,8.9064819396,14.467448241,7.0778564206,7.4349442379,10.246401561,10.243902439,8.78477306,5.316578057,0,2.9607698001,-0.494804552,-6.984285358,2.5278058645,0,-4.391314955,-2.926829268,-2.928257687,2.4166263896,0,0,0,0,0,0,0,0,0,0,-12.15657671,-21.21885023,11.875309253,-22.44948865,0,37.670384139,-0.975847768,8.7804878049,-3.904343582,23.19961334,-12.15657671,-21.21885023,11.875309253,-22.44948865,0,37.670384139,-0.975847768,8.7804878049,-3.904343582,23.19961334 +050,4,8,08,035,Colorado,Douglas County,285465,285480,287011,292626,298826,306407,314783,322333,328680,336347,343780,351842,360750,1531,5615,6200,7581,8376,7550,6347,7667,7433,8062,8908,923,3554,3484,3425,3539,3373,3501,3493,3430,3491,3525,261,904,1038,1047,1034,1259,1341,1346,1439,1522,1704,662,2650,2446,2378,2505,2114,2160,2147,1991,1969,1821,102,468,586,536,568,849,705,558,675,226,183,735,2492,3134,4609,5207,4561,3480,4942,4758,5871,6930,837,2960,3720,5145,5775,5410,4185,5500,5433,6097,7113,32,5,34,58,96,26,2,20,9,-4,-26,651,651,651,651,651,651,651,651,651,651,651,651,12.262847265,11.781175818,11.317955234,11.394259405,10.588338701,10.755545588,10.504836646,10.08635152,10.037060357,9.8934593709,3.1191935642,3.5100058838,3.4598245634,3.329094158,3.9521845315,4.1197334001,4.0479559477,4.2315626346,4.3759398064,4.7825403597,9.1436537005,8.2711699343,7.8581306703,8.0651652473,6.6361541697,6.6358121881,6.4568806981,5.854788885,5.6611205511,5.1109190112,1.6148037479,1.9815640153,1.7712186877,1.8287480481,2.6651347635,2.1658553669,1.6781273542,1.984923404,0.6497781841,0.5136178907,8.5984849138,10.597647823,15.230498007,16.764596983,14.317643883,10.691030747,14.862554453,13.991504528,16.879857164,19.450120125,10.213288662,12.579211838,17.001716694,18.593345031,16.982778646,12.856886114,16.540681807,15.976427932,17.529635348,19.963738016 +050,4,8,08,037,Colorado,Eagle County,52197,52200,52098,52048,52330,52814,53276,53863,54578,55022,55087,55183,54929,-102,-50,282,484,462,587,715,444,65,96,-254,197,652,696,602,659,645,663,602,578,562,559,9,83,98,118,121,112,120,124,140,139,163,188,569,598,484,538,533,543,478,438,423,396,28,278,64,56,62,140,109,156,211,77,52,-344,-904,-381,-55,-128,-81,63,-189,-586,-404,-702,-316,-626,-317,1,-66,59,172,-33,-375,-327,-650,26,7,1,-1,-10,-5,0,-1,2,0,0,55,55,55,55,55,55,55,55,55,55,55,55,12.520884143,13.336143632,11.45096249,12.423414082,12.040433456,12.227847401,10.98540146,10.498687664,10.193162238,10.15329846,1.593916233,1.877790339,2.2445408202,2.2810821001,2.0907419334,2.2131850499,2.2627737226,2.5429347283,2.5210846105,2.9606219122,10.92696791,11.458353293,9.2064216693,10.142331982,9.9496915222,10.014662351,8.7226277372,7.9557529357,7.6720776276,7.1926765475,5.33865919,1.2263120581,1.065205813,1.1688189273,2.6134274167,2.0103097537,2.8467153285,3.832565912,1.3965720504,0.94449288,-17.36024427,-7.300388971,-1.046184281,-2.413045527,-1.512054434,1.1619221512,-3.448905109,-10.64399822,-7.32746894,-12.75065388,-12.02158508,-6.074076913,0.0190215324,-1.2442266,1.1013729828,3.1722319049,-0.602189781,-6.811432308,-5.930896889,-11.806161 +050,4,8,08,039,Colorado,Elbert County,23086,23084,23137,23175,23276,23543,24035,24634,25130,25735,26267,26707,27313,53,38,101,267,492,599,496,605,532,440,606,31,179,161,158,174,205,196,223,194,219,216,13,109,117,127,119,138,123,152,148,157,170,18,70,44,31,55,67,73,71,46,62,46,5,9,0,0,26,47,19,11,15,8,5,32,-41,59,235,406,481,403,523,474,371,560,37,-32,59,235,432,528,422,534,489,379,565,-2,0,-2,1,5,4,1,0,-3,-1,-5,73,73,73,73,73,73,73,73,73,73,73,73,7.7301779236,6.9320359088,6.7493966125,7.3143049309,8.4242536317,7.877180291,8.768308267,7.4612514903,8.268207045,7.997038134,4.7072033166,5.0375664679,5.42514791,5.0023119929,5.6709609813,4.9433325295,5.976604738,5.6920887658,5.9274361007,6.2939651981,3.022974607,1.8944694409,1.3242487024,2.3119929379,2.7532926504,2.9338477614,2.7917035289,1.7691627245,2.3407709442,1.7030729359,0.3886681638,0,0,1.0929421161,1.9314142473,0.7636042119,0.4325174481,0.5769008884,0.3020349605,0.1851166235,-1.770599413,2.5403112958,10.038659519,17.066711505,19.766175594,16.196447231,20.564238671,18.230068074,14.006871295,20.733061829,-1.381931249,2.5403112958,10.038659519,18.159653621,21.697589842,16.960051443,20.996756119,18.806968963,14.308906256,20.918178452 +050,4,8,08,041,Colorado,El Paso County,622263,622256,627088,637376,645900,655178,662968,674094,688671,700838,712746,721929,728310,4832,10288,8524,9278,7790,11126,14577,12167,11908,9183,6381,2258,9230,9164,9082,9185,9436,9482,9475,9339,9136,9089,864,3671,3775,3913,4061,4126,4289,4618,4611,4935,5259,1394,5559,5389,5169,5124,5310,5193,4857,4728,4201,3830,508,1061,2866,1692,1550,2187,1132,548,407,2,77,2727,3660,421,2440,1207,3638,8208,6720,6736,4944,2429,3235,4721,3287,4132,2757,5825,9340,7268,7143,4946,2506,203,8,-152,-23,-91,-9,44,42,37,36,45,19141,19132,18971,18311,18342,18710,18338,19412,19518,18599,20598,19818,14.599071227,14.282196503,13.960731025,13.93624075,14.11452872,13.915825546,13.637910946,13.213222561,12.735985502,12.534485695,5.8064128358,5.883379725,6.0150121668,6.1616846692,6.1717407271,6.2945555543,6.6469522688,6.5238429411,6.8796068796,7.2525976753,8.7926583912,8.3988167783,7.9457188577,7.774556081,7.9427879934,7.6212699915,6.9909586768,6.6893796195,5.8563786223,5.2818880198,1.6781814271,4.4666930575,2.6009201601,2.3517880417,3.2713516651,1.6613282554,0.7887678309,0.5758412659,0.0027880879,0.1061893936,5.7890141594,0.6561332091,3.7507359282,1.8313601073,5.4417820565,12.046097456,9.6724814305,9.530385177,6.8921532751,3.3497926893,7.4671955864,5.1228262665,6.3516560883,4.183148149,8.7131337215,13.707425712,10.461249261,10.106226443,6.894941363,3.455982083 +050,4,8,08,043,Colorado,Fremont County,46824,46825,46834,47393,47072,46360,46185,46327,47047,47633,48070,48009,47867,9,559,-321,-712,-175,142,720,586,437,-61,-142,81,379,389,334,380,381,382,376,375,399,378,155,530,498,529,541,546,541,577,571,572,612,-74,-151,-109,-195,-161,-165,-159,-201,-196,-173,-234,13,102,65,-5,8,1,10,3,4,-4,-1,69,604,-286,-519,-15,307,865,781,627,118,91,82,706,-221,-524,-7,308,875,784,631,114,90,1,4,9,7,-7,-1,4,3,2,-2,2,8704,8727,9051,8689,8408,8257,8192,8326,8454,8414,8241,7851,8.0444034088,8.2358545493,7.1495847247,8.2122210816,8.236769284,8.1821492064,7.9425433038,7.8367449296,8.3056651297,7.8851850307,11.249429569,10.543587572,11.323743471,11.691609487,11.803874092,11.587808169,12.188424166,11.93275028,11.906868306,12.76649005,-3.20502616,-2.307733023,-4.174158746,-3.479388406,-3.567104808,-3.405658963,-4.245880862,-4.09600535,-3.601203177,-4.881305019,2.1649845586,1.3761710686,-0.107029711,0.1728888649,0.021618817,0.2141923876,0.0633713561,0.0835919459,-0.083264813,-0.020860278,12.820104641,-6.055152702,-11.10968405,-0.324166622,6.6369768246,18.527641528,16.497676384,13.103037522,2.4563119933,1.8982852852,14.985089199,-4.678981633,-11.21671376,-0.151277757,6.6585956416,18.741833915,16.56104774,13.186629468,2.3730471799,1.8774250073 +050,4,8,08,045,Colorado,Garfield County,56389,56373,56072,56049,56765,56945,57174,57724,58839,59065,59722,60031,60366,-301,-23,716,180,229,550,1115,226,657,309,335,231,862,789,822,776,763,842,827,782,758,763,82,294,257,285,290,344,341,328,350,369,405,149,568,532,537,486,419,501,499,432,389,358,10,135,23,-13,11,14,-15,40,98,-3,1,-497,-731,169,-343,-259,122,627,-311,127,-78,-28,-487,-596,192,-356,-248,136,612,-271,225,-81,-27,37,5,-8,-1,-9,-5,2,-2,0,1,4,884,884,882,884,857,884,883,884,884,883,884,865,15.376245306,13.987625649,14.457831325,13.599838765,13.281345193,14.447123015,14.028362057,13.166423935,12.659390579,12.67473442,5.244334246,4.5561721063,5.0127517369,5.0824139714,5.9879197201,5.8509132401,5.5638485548,5.8929007383,6.1626848597,6.7277423856,10.13191106,9.431453543,9.4450795884,8.5174247934,7.293425473,8.596209775,8.4645135025,7.273523197,6.4967057193,5.9469920347,2.408112664,0.4077508111,-0.228651834,0.1927812196,0.2436944072,-0.25737155,0.6785181164,1.6500122067,-0.050103129,0.0166117096,-13.03948413,2.9960820466,-6.032890687,-4.539121443,2.1236226914,10.758130796,-5.275478355,2.138281125,-1.302681352,-0.465127869,-10.63137146,3.4038328576,-6.26154252,-4.346340224,2.3673170986,10.500759246,-4.596960239,3.7882933318,-1.352784481,-0.448516159 +050,4,8,08,047,Colorado,Gilpin County,5441,5449,5471,5429,5432,5535,5754,5813,5920,6024,6131,6232,6235,22,-42,3,103,219,59,107,104,107,101,3,10,45,39,50,40,39,39,41,41,28,31,0,28,27,21,30,33,30,28,24,30,38,10,17,12,29,10,6,9,13,17,-2,-7,1,2,2,0,0,0,0,0,0,0,0,9,-61,-11,73,203,51,96,91,89,102,10,10,-59,-9,73,203,51,96,91,89,102,10,2,0,0,1,6,2,2,0,1,1,0,49,49,49,49,49,49,49,49,49,49,49,49,8.2568807339,7.1816591474,9.1182638826,7.0865444238,6.7433215181,6.647916134,6.8653717348,6.7461949815,4.5296449082,4.9731290607,5.1376146789,4.9719178713,3.8296708307,5.3149083178,5.7058874384,5.1137816415,4.6885465506,3.9489921843,4.8531909731,6.0960936873,3.119266055,2.2097412761,5.2885930519,1.7716361059,1.0374340797,1.5341344925,2.1768251842,2.7972027972,-0.323546065,-1.122964627,0.3669724771,0.3682902127,0,0,0,0,0,0,0,0,-11.19266055,-2.02559617,13.312665269,35.964212951,8.8181896775,16.364101253,15.237776289,14.64417935,16.500849308,1.6042351809,-10.82568807,-1.657305957,13.312665269,35.964212951,8.8181896775,16.364101253,15.237776289,14.64417935,16.500849308,1.6042351809 +050,4,8,08,049,Colorado,Grand County,14843,14843,14795,14564,14227,14320,14569,14742,15198,15385,15556,15748,15794,-48,-231,-337,93,249,173,456,187,171,192,46,27,105,110,117,125,110,128,130,105,112,110,4,66,45,61,67,76,64,67,85,63,70,23,39,65,56,58,34,64,63,20,49,40,5,23,1,4,6,23,13,12,17,7,8,-80,-296,-415,31,179,114,377,110,132,138,-3,-75,-273,-414,35,185,137,390,122,149,145,5,4,3,12,2,6,2,2,2,2,-2,1,222,222,221,222,222,222,223,222,222,222,222,222,7.1528321809,7.6412767879,8.1970084422,8.65381287,7.5057145781,8.5504342017,8.5014550567,6.7871109531,7.1556350626,6.9748272145,4.4960659423,3.1259768678,4.2736539741,4.6384436983,5.1857664358,4.2752171009,4.3815191446,5.4943279144,4.0250447227,4.4385264092,2.6567662386,4.5152999201,3.9233544681,4.0153691717,2.3199481423,4.2752171009,4.1199359121,1.2927830387,3.1305903399,2.5363008053,1.5668108587,0.0694661526,0.2802396049,0.4153830178,1.5693766845,0.8684034736,0.7847496975,1.0988655829,0.4472271914,0.5072601611,-20.16417453,-28.82845334,2.1718569377,12.39226003,7.7786496537,25.183700735,7.1935388942,8.5323680553,8.8167646307,-0.19022256,-18.59736367,-28.75898718,2.4520965425,12.807643048,9.3480263382,26.052104208,7.9782885917,9.6312336382,9.2639918221,0.3170376007 +050,4,8,08,051,Colorado,Gunnison County,15324,15324,15290,15267,15390,15597,15786,16125,16447,16896,17177,17480,17593,-34,-23,123,207,189,339,322,449,281,303,113,41,152,165,151,134,137,157,135,125,133,131,26,52,77,68,55,77,79,69,79,71,77,15,100,88,83,79,60,78,66,46,62,54,2,11,-8,-1,-1,7,5,8,9,5,0,-52,-136,42,123,106,266,236,372,224,235,58,-50,-125,34,122,105,273,241,380,233,240,58,1,2,1,2,5,6,3,3,2,1,1,850,850,734,828,993,981,978,1009,1025,1022,1006,990,9.9486206107,10.764262648,9.7460225256,8.5396552274,8.5863808718,9.6401817512,8.097651681,7.3371878027,7.6752171279,7.4701337211,3.4034754721,5.0233225691,4.3889372963,3.5050823694,4.8259220958,4.8507920914,4.1387997481,4.6371026913,4.0972963615,4.3908419582,6.5451451386,5.7409400789,5.3570852293,5.0345728579,3.760458776,4.7893896598,3.9588519329,2.7000851114,3.5779207664,3.0792917629,0.7199659652,-0.521903644,-0.064543196,-0.06372877,0.4387201905,0.3070121577,0.4798608404,0.5282775218,0.2885419973,0,-8.901397388,2.7399941286,7.9388130506,6.7552496575,16.67136724,14.490973843,22.313529077,13.148240542,13.561473873,3.307387449,-8.181431423,2.218090485,7.8742698551,6.6915208871,17.110087431,14.797986,22.793389917,13.676518064,13.85001587,3.307387449 +050,4,8,08,053,Colorado,Hinsdale County,843,843,844,825,802,803,772,762,783,788,786,789,808,1,-19,-23,1,-31,-10,21,5,-2,3,19,0,5,6,8,7,6,2,4,1,7,6,0,7,3,5,3,7,5,4,7,10,7,0,-2,3,3,4,-1,-3,0,-6,-3,-1,0,0,0,0,0,0,0,0,0,0,0,0,-17,-28,-1,-36,-9,24,4,4,7,20,0,-17,-28,-1,-36,-9,24,4,4,7,20,1,0,2,-1,1,0,0,1,0,-1,0,56,56,56,56,56,56,56,56,56,56,56,56,5.9916117436,7.3755377996,9.968847352,8.8888888889,7.8226857888,2.5889967638,5.0922978994,1.2706480305,8.8888888889,7.5140889167,8.388256441,3.6877688998,6.230529595,3.8095238095,9.1264667536,6.4724919094,5.0922978994,8.8945362135,12.698412698,8.7664370695,-2.396644697,3.6877688998,3.738317757,5.0793650794,-1.303780965,-3.883495146,0,-7.623888183,-3.80952381,-1.252348153,0,0,0,0,0,0,0,0,0,0,-20.37147993,-34.4191764,-1.246105919,-45.71428571,-11.73402868,31.067961165,5.0922978994,5.082592122,8.8888888889,25.046963056,-20.37147993,-34.4191764,-1.246105919,-45.71428571,-11.73402868,31.067961165,5.0922978994,5.082592122,8.8888888889,25.046963056 +050,4,8,08,055,Colorado,Huerfano County,6711,6712,6681,6527,6567,6465,6399,6408,6583,6632,6877,6868,6883,-31,-154,40,-102,-66,9,175,49,245,-9,15,10,45,57,49,43,54,43,43,44,48,39,13,107,106,95,95,104,114,118,101,99,106,-3,-62,-49,-46,-52,-50,-71,-75,-57,-51,-67,4,20,3,0,0,1,3,2,4,0,0,-32,-113,83,-54,-13,58,242,121,297,43,84,-28,-93,86,-54,-13,59,245,123,301,43,84,0,1,3,-2,-1,0,1,1,1,-1,-2,165,165,165,165,165,165,165,165,165,165,165,165,6.8140520896,8.7062776844,7.5199508901,6.6853233831,8.4328882642,6.6199676699,6.5077563375,6.5141757347,6.9843579483,5.6723147407,16.202301635,16.190621659,14.579496624,14.769900498,16.241118139,17.550611962,17.858494135,14.9529943,14.405238268,15.417060577,-9.388249546,-7.484343974,-7.059545734,-8.084577114,-7.808229874,-10.93064429,-11.3507378,-8.438818565,-7.42088032,-9.744745837,3.0284675954,0.4582251413,0,0,0.1561645975,0.4618582095,0.3026863413,0.5921977941,0,0,-17.11084191,12.677562242,-8.287292818,-2.021144279,9.0575466542,37.256562235,18.312523647,43.970686209,6.2568206621,12.217293288,-14.08237432,13.135787384,-8.287292818,-2.021144279,9.2137112517,37.718420445,18.615209989,44.562884003,6.2568206621,12.217293288 +050,4,8,08,057,Colorado,Jackson County,1394,1393,1388,1357,1325,1338,1385,1352,1356,1376,1403,1397,1389,-5,-31,-32,13,47,-33,4,20,27,-6,-8,3,12,9,6,16,12,12,15,14,14,12,0,10,15,10,12,10,13,13,15,9,12,3,2,-6,-4,4,2,-1,2,-1,5,0,0,0,0,0,1,0,0,1,1,1,1,-8,-33,-26,15,41,-35,6,16,27,-12,-9,-8,-33,-26,15,42,-35,6,17,28,-11,-8,0,0,0,2,1,0,-1,1,0,0,0,2,2,2,2,2,2,2,2,2,2,2,2,8.7431693989,6.711409396,4.5061960195,11.7517444,8.7687248813,8.8626292467,10.980966325,10.075566751,10,8.6145010768,7.2859744991,11.185682327,7.5103266992,8.8138082997,7.3072707344,9.6011816839,9.5168374817,10.79525009,6.4285714286,8.6145010768,1.4571948998,-4.474272931,-3.00413068,2.9379360999,1.4614541469,-0.738552437,1.4641288433,-0.719683339,3.5714285714,0,0,0,0,0.734484025,0,0,0.7320644217,0.7196833393,0.7142857143,0.7178750897,-24.04371585,-19.38851603,11.265490049,30.113845024,-25.57544757,4.4313146233,11.713030747,19.431450162,-8.571428571,-6.460875808,-24.04371585,-19.38851603,11.265490049,30.848329049,-25.57544757,4.4313146233,12.445095168,20.151133501,-7.857142857,-5.743000718 +050,4,8,08,059,Colorado,Jefferson County,534543,534832,535567,540582,546736,552242,559099,565240,571823,576041,580027,582800,583283,735,5015,6154,5506,6857,6141,6583,4218,3986,2773,483,1482,5554,5556,5625,5938,5843,5896,5977,5612,5723,5701,915,3741,3898,3998,4117,4407,4307,4499,4499,4627,5002,567,1813,1658,1627,1821,1436,1589,1478,1113,1096,699,135,732,630,447,552,748,607,606,795,253,209,97,2473,3823,3409,4392,3937,4370,2124,2065,1409,-447,232,3205,4453,3856,4944,4685,4977,2730,2860,1662,-238,-64,-3,43,23,92,20,17,10,13,15,22,7450,7454,7740,7702,7755,7790,7793,7917,8611,8264,8294,8123,10.321990728,10.219641356,10.23678363,10.686189027,10.39366241,10.370577532,10.414125715,9.7087714564,9.8432526937,9.7780346682,6.9525688357,7.1699355662,7.275850836,7.409067064,7.8392726749,7.5756576373,7.8389077452,7.7832791843,7.9581915453,8.5791491686,3.3694218923,3.0497057898,2.9609327939,3.2771219635,2.5543897348,2.7949198945,2.5752179701,1.9254922721,1.8850611484,1.1988854996,1.3604064121,1.1588146246,0.8134830725,0.9933944667,1.3305595554,1.0676629175,1.0558742151,1.3753516229,0.4351464147,0.3584650492,4.5960178377,7.0319814443,6.2039458479,7.9039646697,7.0032258954,7.6864694392,3.7007868528,3.5724542155,2.4234043413,-0.766669268,5.9564242498,8.1907960689,7.0174289203,8.8973591364,8.3337854508,8.7541323568,4.7566610679,4.9478058384,2.858550756,-0.408204219 +050,4,8,08,061,Colorado,Kiowa County,1398,1398,1404,1432,1410,1393,1382,1386,1346,1368,1385,1417,1458,6,28,-22,-17,-11,4,-40,22,17,32,41,3,20,8,15,19,15,19,17,18,20,19,2,22,21,18,20,24,21,21,25,12,14,1,-2,-13,-3,-1,-9,-2,-4,-7,8,5,0,0,0,0,0,0,0,1,1,1,1,4,30,-8,-14,-11,13,-39,25,23,25,34,4,30,-8,-14,-11,13,-39,26,24,26,35,1,0,-1,0,1,0,1,0,0,-2,1,14,14,14,14,14,14,14,14,14,14,14,14,14.104372355,5.6298381422,10.702818409,13.693693694,10.838150289,13.909224012,12.527634488,13.076643661,14.275517488,13.217391304,15.514809591,14.778325123,12.843382091,14.414414414,17.341040462,15.373352855,15.475313191,18.162005085,8.5653104925,9.7391304348,-1.410437236,-9.148486981,-2.140563682,-0.720720721,-6.502890173,-1.464128843,-2.947678703,-5.085361424,5.710206995,3.4782608696,0,0,0,0,0,0,0.7369196758,0.7264802034,0.7137758744,0.6956521739,21.156558533,-5.629838142,-9.989297182,-7.927927928,9.3930635838,-28.55051245,18.422991894,16.709044679,17.844396859,23.652173913,21.156558533,-5.629838142,-9.989297182,-7.927927928,9.3930635838,-28.55051245,19.15991157,17.435524882,18.558172734,24.347826087 +050,4,8,08,063,Colorado,Kit Carson County,8270,8278,8271,8183,8088,8259,8028,8223,7632,7149,7166,7161,7121,-7,-88,-95,171,-231,195,-591,-483,17,-5,-40,29,104,94,82,95,114,94,87,79,93,91,27,82,69,76,79,76,79,72,76,52,71,2,22,25,6,16,38,15,15,3,41,20,-2,18,8,3,-2,2,4,5,9,4,4,-5,-132,-130,153,-258,152,-618,-509,4,-49,-64,-7,-114,-122,156,-260,154,-614,-504,13,-45,-60,-2,4,2,9,13,3,8,6,1,-1,0,1075,1075,887,822,1070,797,1027,481,58,58,58,58,12.641303027,11.55429906,10.032421851,11.665745687,14.029905852,11.857458215,11.771869292,11.037373385,12.982480631,12.743313261,9.9671812325,8.4813471821,9.2983422035,9.7009885185,9.353270568,9.9653106276,9.7422366552,10.618232623,7.2590214281,9.9425850721,2.6741217941,3.0729518776,0.7340796476,1.9647571683,4.676635284,1.8921475875,2.0296326365,0.4191407614,5.7234592029,2.8007281893,2.1879178315,0.9833446008,0.3670398238,-0.245594646,0.2461386992,0.50457269,0.6765442122,1.2574222843,0.5583862637,0.5601456379,-16.04473076,-15.97934976,18.719031015,-31.68170934,18.706541136,-77.95648061,-68.8722008,0.5588543486,-6.84023173,-8.962330206,-13.85681293,-14.99600516,19.086070839,-31.92730398,18.952679835,-77.45190792,-68.19565659,1.8162766329,-6.281845467,-8.402184568 +050,4,8,08,065,Colorado,Lake County,7310,7310,7263,7344,7259,7276,7333,7455,7591,7769,7807,8072,7987,-47,81,-85,17,57,122,136,178,38,265,-85,25,103,73,79,79,85,64,84,82,96,95,14,42,41,38,43,43,44,37,37,20,35,11,61,32,41,36,42,20,47,45,76,60,-5,1,-4,0,-6,-8,-1,4,9,1,2,-55,18,-114,-22,23,86,117,126,-15,188,-147,-60,19,-118,-22,17,78,116,130,-6,189,-145,2,1,1,-2,4,2,0,1,-1,0,0,133,133,140,140,140,146,163,152,152,153,153,153,14.102827412,9.9979456276,10.870313037,10.815250873,11.495807411,8.5072444504,10.9375,10.529019004,12.091441527,11.831371816,5.7506674882,5.6152845306,5.2287581699,5.8867821206,5.8155261022,5.8487305596,4.8177083333,4.7508988187,2.519050318,4.3589264587,8.3521599233,4.382661097,5.6415548676,4.9284687521,5.6802813092,2.6585138907,6.1197916667,5.7781201849,9.5723912085,7.4724453577,0.1369206545,-0.547832637,0,-0.821411459,-1.081958345,-0.132925695,0.5208333333,1.155624037,0.1259525159,0.2490815119,2.4645717807,-15.61323016,-3.027175783,3.148743925,11.631052204,15.552306261,16.40625,-1.926040062,23.679072989,-18.30749113,2.6014924351,-16.1610628,-3.027175783,2.3273324663,10.54909386,15.419380566,16.927083333,-0.770416025,23.805025505,-18.05840961 +050,4,8,08,067,Colorado,La Plata County,51334,51335,51416,51886,52489,53432,53941,54776,55459,55717,56511,56440,56564,81,470,603,943,509,835,683,258,794,-71,124,164,543,533,497,549,577,574,502,458,451,439,85,249,335,316,302,357,358,359,346,342,399,79,294,198,181,247,220,216,143,112,109,40,9,31,20,15,7,10,18,9,19,1,1,-3,145,372,723,253,597,449,107,661,-180,81,6,176,392,738,260,607,467,116,680,-179,82,-4,0,13,24,2,8,0,-1,2,-1,2,1715,1716,1716,1869,2091,1966,2011,1954,1883,1878,1760,1809,10.512865191,10.213173653,9.3843524891,10.226034478,10.61471527,10.414115299,9.030726056,8.1619560181,7.9857637383,7.769636473,4.8208166347,6.4191616766,5.9667110394,5.6252502957,6.567510141,6.4952147684,6.4582283946,6.1660191753,6.0557232782,7.0616969311,5.6920485567,3.794011976,3.4176414498,4.6007841822,4.0472051289,3.9189005307,2.5724976614,1.9959368429,1.93004046,0.707939542,0.6001819907,0.3832335329,0.2832299544,0.1303865963,0.1839638695,0.3265750442,0.1619054472,0.3385964287,0.0177067932,0.0176984885,2.8073028596,7.1281437126,13.651683802,4.7125441219,10.982643009,8.1462330476,1.9248758725,11.779591546,-3.187222778,1.4335775725,3.4074848502,7.5113772455,13.934913756,4.8429307182,11.166606878,8.4728080918,2.0867813197,12.118187974,-3.169515985,1.451276061 +050,4,8,08,069,Colorado,Larimer County,299630,299628,300453,305320,310983,316426,324272,333637,339394,344509,351045,357241,360428,825,4867,5663,5443,7846,9365,5757,5115,6536,6196,3187,842,3319,3404,3376,3497,3445,3474,3341,3284,3171,3241,487,1870,1871,1989,1982,2257,2183,2412,2397,2330,2488,355,1449,1533,1387,1515,1188,1291,929,887,841,753,94,549,554,506,473,658,525,456,577,192,162,377,2854,3483,3480,5695,7398,3919,3709,5051,5156,2257,471,3403,4037,3986,6168,8056,4444,4165,5628,5348,2419,-1,15,93,70,163,121,22,21,21,7,15,8530,8531,8373,8436,8604,8904,9332,9282,9336,9370,10004,9905,10.957900071,11.046514458,10.761720026,10.916219498,10.472572955,10.323447211,9.7703914152,9.4428326198,8.9540101033,9.0320189391,6.1739298384,6.0716887635,6.3403617098,6.1870023006,6.8611312507,6.487071175,7.0536318747,6.8923476826,6.579263179,6.9335585068,4.7839702331,4.9748256945,4.4213583165,4.7292171975,3.6114417039,3.8363760362,2.7167595405,2.5504849372,2.3747469243,2.0984604323,1.8125601504,1.7978169829,1.6129829186,1.4765146762,2.000276634,1.5601064438,1.333522444,1.6591091418,0.5421538757,0.451461607,9.4226715288,11.302881862,11.093242207,17.777486429,22.489432429,11.645823149,10.846567423,14.523674654,14.559090537,6.2898076969,11.235231679,13.100698845,12.706225126,19.254001105,24.489709063,13.205929593,12.180089867,16.182783795,15.101244413,6.7412693038 +050,4,8,08,071,Colorado,Las Animas County,15507,15506,15422,15054,14996,14404,14054,14048,14085,14237,14460,14415,14420,-84,-368,-58,-592,-350,-6,37,152,223,-45,5,30,150,150,147,117,126,128,146,101,126,111,38,197,164,186,164,178,186,181,168,159,177,-8,-47,-14,-39,-47,-52,-58,-35,-67,-33,-66,3,17,7,11,18,19,25,29,30,17,14,-83,-339,-51,-579,-329,29,71,157,261,-27,57,-80,-322,-44,-568,-311,48,96,186,291,-10,71,4,1,0,15,8,-2,-1,1,-1,-2,0,858,858,858,799,801,867,870,872,869,901,884,808,9.8438115238,9.9833610649,10,8.2226438963,8.9673332859,9.0996338819,10.310006355,7.0390633167,8.7272727273,7.6989769377,12.928205801,10.915141431,12.653061224,11.525757256,12.668137499,13.222905485,12.781583222,11.708540962,11.012987013,12.276747009,-3.084394277,-0.931780366,-2.653061224,-3.30311336,-3.700804213,-4.123271603,-2.471576866,-4.669477646,-2.285714286,-4.577770071,1.1156319727,0.465890183,0.7482993197,1.2650221379,1.3522169241,1.7772722426,2.0478779747,2.0908108862,1.1774891775,0.9710421363,-22.24701404,-3.394342762,-39.3877551,-23.12179352,2.063910042,5.0474531689,11.086787656,18.19005471,-1.87012987,3.9535286978,-21.13138207,-2.928452579,-38.63945578,-21.85677138,3.4161269661,6.8247254114,13.134665631,20.280865596,-0.692640693,4.9245708341 +050,4,8,08,073,Colorado,Lincoln County,5467,5469,5471,5420,5441,5435,5503,5545,5546,5526,5595,5694,5680,2,-51,21,-6,68,42,1,-20,69,99,-14,12,64,48,71,51,74,49,54,57,63,58,15,51,56,42,46,65,60,52,55,57,48,-3,13,-8,29,5,9,-11,2,2,6,10,-1,7,7,0,1,2,3,4,5,4,3,6,-71,22,-36,61,31,10,-27,62,89,-27,5,-64,29,-36,62,33,13,-23,67,93,-24,0,0,0,1,1,0,-1,1,0,0,0,1030,1030,1005,1030,1030,1028,1018,957,954,1011,1018,1011,11.752823432,8.8389651045,13.056270688,9.3252879868,13.39608979,8.8359931476,9.7543352601,10.25087672,11.161307467,10.198698787,9.3655311725,10.312125955,7.7234277308,8.4110440666,11.766835626,10.819583446,9.3930635838,9.8911968348,10.098325804,8.4403024442,2.3872922597,-1.473160851,5.332842957,0.9142439203,1.6292541636,-1.983590298,0.3612716763,0.3596798849,1.0629816636,1.7583963425,1.2854650629,1.2890157444,0,0.1828487841,0.3620564808,0.5409791723,0.7225433526,0.8991997123,0.7086544424,0.5275189028,-13.0382885,4.0511923396,-6.620080912,11.153775827,5.6118754526,1.8032639077,-4.87716763,11.150076432,15.767561343,-4.747670125,-11.75282343,5.340208084,-6.620080912,11.336624611,5.9739319334,2.34424308,-4.154624277,12.049276144,16.476215785,-4.220151222 +050,4,8,08,075,Colorado,Logan County,22709,22709,22749,22577,22360,22182,22446,22484,22427,22314,22286,22409,21974,40,-172,-217,-178,264,38,-57,-113,-28,123,-435,58,211,222,253,238,220,223,239,236,217,219,29,184,184,199,240,185,258,229,197,208,218,29,27,38,54,-2,35,-35,10,39,9,1,-1,-10,-8,23,18,24,0,-3,0,-5,-7,15,-189,-256,-257,242,-19,-21,-118,-68,121,-427,14,-199,-264,-234,260,5,-21,-121,-68,116,-434,-3,0,9,2,6,-2,-1,-2,1,-2,-2,3904,3917,3868,3702,3655,3812,3776,3830,3813,3855,3833,3448,9.3103296121,9.8804993658,11.360064658,10.665949628,9.793011351,9.9307519316,10.683712926,10.582959641,9.7102584182,9.8686433995,8.1189604201,8.1892427176,8.9353868259,10.755579457,8.2350322724,11.489390127,10.236695648,8.8340807175,9.3075288064,9.8235811009,1.1913691921,1.6912566482,2.4246778322,-0.089629829,1.5579790786,-1.558638196,0.4470172772,1.7488789238,0.4027296118,0.0450622986,-0.441247849,-0.356054031,1.0327331507,0.8066684593,1.068328511,0,-0.134105183,0,-0.223738673,-0.31543609,-8.339584345,-11.393729,-11.53967042,10.845209286,-0.845760071,-0.935182917,-5.274803871,-3.049327354,5.4144758922,-19.24160151,-8.780832193,-11.74978303,-10.50693727,11.651877745,0.2225684398,-0.935182917,-5.408909054,-3.049327354,5.1907372189,-19.5570376 +050,4,8,08,077,Colorado,Mesa County,146723,146736,146266,147205,147360,147249,147215,148159,149882,151435,153339,154552,155603,-470,939,155,-111,-34,944,1723,1553,1904,1213,1051,474,1908,1819,1854,1760,1828,1709,1656,1660,1637,1596,327,1306,1306,1384,1385,1500,1478,1523,1527,1613,1688,147,602,513,470,375,328,231,133,133,24,-92,19,89,-6,-4,-36,6,17,26,59,-11,0,-668,255,-321,-560,-354,614,1471,1393,1710,1200,1141,-649,344,-327,-564,-390,620,1488,1419,1769,1189,1141,32,-7,-31,-17,-19,-4,4,1,2,0,2,3625,3625,3920,4089,4314,4040,4430,4607,4449,4440,4436,4434,13.00298837,12.350415019,12.586173538,11.95392306,12.377528151,11.468220815,10.991746234,10.893317671,10.633633331,10.291628379,8.9003683499,8.8673128172,9.3955038712,9.4069224082,10.156615003,9.9180985166,10.108955021,10.02053981,10.477734003,10.884880141,4.1026200204,3.4831022016,3.1906696673,2.547000652,2.2209131474,1.5501222986,0.8827912132,0.8727778616,0.155899328,-0.593251761,0.6065335246,-0.040738037,-0.027154635,-0.244512063,0.04062646,0.1140782644,0.1725757259,0.3871721341,-0.071453859,0,1.7378207728,-2.179485003,-3.801648965,-2.404368616,4.1574410747,9.8711251137,9.2460763913,11.22142965,7.7949664004,7.3576115168,2.3443542974,-2.220223041,-3.828803601,-2.648880678,4.1980675347,9.9852033781,9.4186521172,11.608601784,7.7235125418,7.3576115168 +050,4,8,08,079,Colorado,Mineral County,712,712,704,711,719,732,703,742,756,753,774,756,773,-8,7,8,13,-29,39,14,-3,21,-18,17,1,5,6,4,5,4,10,6,8,4,6,4,3,5,4,4,7,5,16,5,9,10,-3,2,1,0,1,-3,5,-10,3,-5,-4,0,0,0,0,0,0,0,0,0,0,0,-5,5,7,12,-31,41,10,6,20,-14,22,-5,5,7,12,-31,41,10,6,20,-14,22,0,0,0,1,1,1,-1,1,-2,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,7.0671378092,8.3916083916,5.5134390076,6.968641115,5.5363321799,13.351134846,7.9522862823,10.478061559,5.2287581699,7.8482668411,4.2402826855,6.993006993,5.5134390076,5.574912892,9.6885813149,6.6755674232,21.206096753,6.5487884741,11.764705882,13.080444735,2.8268551237,1.3986013986,0,1.393728223,-4.152249135,6.6755674232,-13.25381047,3.9292730845,-6.535947712,-5.232177894,0,0,0,0,0,0,0,0,0,0,7.0671378092,9.7902097902,16.540317023,-43.20557491,56.747404844,13.351134846,7.9522862823,26.195153897,-18.30065359,28.776978417,7.0671378092,9.7902097902,16.540317023,-43.20557491,56.747404844,13.351134846,7.9522862823,26.195153897,-18.30065359,28.776978417 +050,4,8,08,081,Colorado,Moffat County,13795,13791,13795,13424,13172,13129,12941,12946,13155,13095,13148,13209,13144,4,-371,-252,-43,-188,5,209,-60,53,61,-65,59,187,165,192,177,192,183,177,156,161,154,44,68,120,91,93,96,96,103,99,107,99,15,119,45,101,84,96,87,74,57,54,55,4,23,10,5,-1,3,1,4,8,-1,-1,-16,-517,-316,-152,-279,-93,122,-139,-11,8,-117,-12,-494,-306,-147,-280,-90,123,-135,-3,7,-118,1,4,9,3,8,-1,-1,1,-1,0,-2,102,102,102,102,102,103,102,102,102,102,102,102,13.740401925,12.407880884,14.600205315,13.578826237,14.833700313,14.022451247,13.485714286,11.888884655,12.216868384,11.687473912,4.996509791,9.0239133704,6.9198889776,7.1346375144,7.4168501564,7.3560399985,7.8476190476,7.544869108,8.1192851994,7.5133760862,8.7438921342,3.3839675139,7.6803163378,6.4441887227,7.4168501564,6.6664112486,5.6380952381,4.344015547,4.0975831847,4.1740978257,1.6899959587,0.7519927809,0.3802136801,-0.076716532,0.2317765674,0.0766254167,0.3047619048,0.6096863926,-0.07588117,-0.075892688,-37.98817003,-23.76297188,-11.55849587,-21.40391254,-7.185073589,9.3483008314,-10.59047619,-0.83831879,0.6070493607,-8.879444466,-36.29817407,-23.01097909,-11.17828219,-21.48062908,-6.953297022,9.424926248,-10.28571429,-0.228632397,0.5311681906,-8.955337153 +050,4,8,08,083,Colorado,Montezuma County,25535,25541,25576,25489,25497,25575,25551,25763,26063,26187,26303,26369,26408,35,-87,8,78,-24,212,300,124,116,66,39,83,310,293,293,323,329,297,251,284,237,253,40,290,270,253,268,255,267,286,271,271,323,43,20,23,40,55,74,30,-35,13,-34,-70,6,26,6,-12,-11,-7,-2,-5,-5,-5,-3,-11,-133,-14,51,-63,145,273,166,109,106,110,-5,-107,-8,39,-74,138,271,161,104,101,107,-3,0,-7,-1,-5,0,-1,-2,-1,-1,2,243,243,243,243,243,243,243,243,243,243,243,243,12.141388427,11.493351116,11.473997494,12.635449673,12.823011264,11.461428627,9.6076555024,10.821108783,8.9990886999,9.5875097107,11.358073044,10.591142667,9.9075814536,10.483902515,9.9388081225,10.303708563,10.947368421,10.325776338,10.290097205,12.240180382,0.7833153824,0.9022084494,1.5664160401,2.151547158,2.8842031414,1.1577200633,-1.339712919,0.4953324443,-1.291008505,-2.652670671,1.0183099971,0.2353587259,-0.469924812,-0.430309432,-0.272830027,-0.077181338,-0.19138756,-0.190512479,-0.189854192,-0.113685886,-5.209047293,-0.54917036,1.9971804511,-2.464499472,5.6514791285,10.535252576,6.3540669856,4.1531720328,4.02490887,4.1684824829,-4.190737296,-0.313811635,1.5272556391,-2.894808903,5.3786491016,10.458071238,6.1626794258,3.9626595542,3.835054678,4.054796597 +050,4,8,08,085,Colorado,Montrose County,41276,41272,41182,40980,40675,40584,40622,40609,41183,41795,42309,42791,43322,-90,-202,-305,-91,38,-13,574,612,514,482,531,124,497,401,455,477,454,423,466,448,385,410,67,398,458,384,391,460,441,462,426,438,495,57,99,-57,71,86,-6,-18,4,22,-53,-85,5,69,3,-1,-8,-4,-11,-6,6,-14,-8,-156,-371,-251,-159,-34,3,602,614,485,552,625,-151,-302,-248,-160,-42,-1,591,608,491,538,617,4,1,0,-2,-6,-6,1,0,1,-3,-1,542,542,542,542,542,542,542,542,542,542,542,542,12.098050194,9.8218112792,11.198759522,11.747900401,11.177998547,10.343309859,11.231892791,10.653476648,9.0481786134,9.5223717673,9.6881770161,11.217929092,9.4512607834,9.6298303081,11.3257254,10.783450704,11.135481694,10.130314848,10.293772033,11.496522012,2.4098731774,-1.396117813,1.7474987386,2.1180700933,-0.147726853,-0.440140845,0.0964110969,0.5231617997,-1.24559342,-1.974150244,1.6796085782,0.0734798849,-0.024612658,-0.197029776,-0.098484569,-0.268974961,-0.144616645,0.1426804908,-0.329024677,-0.185802376,-9.030938877,-6.147817035,-3.913412668,-0.837376549,0.0738634265,14.720266041,14.799103377,11.533339675,12.972972973,14.515810621,-7.351330299,-6.07433715,-3.938025326,-1.034406325,-0.024621142,14.45129108,14.654486731,11.676020166,12.643948296,14.330008245 +050,4,8,08,087,Colorado,Morgan County,28159,28159,28243,28450,28243,28217,28098,28245,28178,28275,28754,28938,28941,84,207,-207,-26,-119,147,-67,97,479,184,3,127,460,426,412,429,452,429,398,470,412,428,41,278,271,231,240,261,285,280,275,253,268,86,182,155,181,189,191,144,118,195,159,160,36,168,61,72,85,132,122,139,181,97,82,-38,-141,-432,-281,-399,-174,-334,-158,102,-73,-237,-2,27,-371,-209,-314,-42,-212,-19,283,24,-155,0,-2,9,2,6,-2,1,-2,1,1,-2,564,564,564,564,564,564,564,564,563,563,563,563,16.227752985,15.028310373,14.594403117,15.235727604,16.044584065,15.206564699,14.100224966,16.482842063,14.282742841,14.789474594,9.807207239,9.5602631718,8.1827842721,8.5234839741,9.2646823918,10.102263261,9.9197562574,9.6442161006,8.7707134438,9.2606990446,6.4205457464,5.4680472016,6.4116188452,6.7122436296,6.7799016737,5.1043014374,4.1804687085,6.8386259622,5.5120293975,5.528775549,5.9266576121,2.1519411568,2.5504782147,3.0187339075,4.685586497,4.3244776066,4.9244504278,6.347647688,3.362684601,2.8334974689,-4.974159067,-15.23997672,-9.953949699,-14.17029211,-6.176454928,-11.83914361,-5.597576745,3.5771274264,-2.530680164,-8.189498782,0.9524985448,-13.08803556,-7.403471484,-11.1515582,-1.490868431,-7.514666005,-0.673126317,9.9247751144,0.8320044374,-5.356001313 +050,4,8,08,089,Colorado,Otero County,18831,18833,18857,18837,18631,18449,18334,18182,18279,18344,18354,18243,18201,24,-20,-206,-182,-115,-152,97,65,10,-111,-42,43,249,266,189,215,190,228,215,227,202,218,31,221,265,227,263,244,255,225,235,254,241,12,28,1,-38,-48,-54,-27,-10,-8,-52,-23,3,6,3,-3,-2,3,2,3,8,-1,-1,12,-55,-214,-142,-62,-100,122,74,11,-58,-18,15,-49,-211,-145,-64,-97,124,77,19,-59,-19,-3,1,4,1,-3,-1,0,-2,-1,0,0,433,433,433,433,433,433,433,513,509,488,489,489,13.211651722,14.198782961,10.194174757,11.690182965,10.406397196,12.506513809,11.741255495,12.371246389,11.039156215,11.963560531,11.726004139,14.145404078,12.243797195,14.300084278,13.36400482,13.987548339,12.287360402,12.807237452,13.880919201,13.225771046,1.4856475832,0.0533788833,-2.049622438,-2.609901313,-2.957607624,-1.48103453,-0.546104907,-0.435991062,-2.841762986,-1.262210515,0.3183530535,0.1601366499,-0.161812298,-0.108745888,0.1643115347,0.1097062615,0.163831472,0.4359910622,-0.054649288,-0.054878718,-2.918236324,-11.42308103,-7.659115426,-3.371122529,-5.477051156,6.6920819506,4.04117631,0.5994877105,-3.169658715,-0.987816925,-2.599883271,-11.26294438,-7.820927724,-3.479868417,-5.312739621,6.8017882121,4.205007782,1.0354787727,-3.224308003,-1.042695643 +050,4,8,08,091,Colorado,Ouray County,4436,4442,4457,4424,4508,4554,4576,4611,4794,4815,4834,5005,5001,15,-33,84,46,22,35,183,21,19,171,-4,13,28,32,32,34,21,34,32,25,22,22,15,19,18,34,44,26,32,20,34,30,23,-2,9,14,-2,-10,-5,2,12,-9,-8,-1,1,-1,2,1,1,3,2,0,0,0,-1,15,-42,64,46,30,37,178,9,28,180,-2,16,-43,66,47,31,40,180,9,28,180,-3,1,1,4,1,1,0,1,0,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,6.3055962166,7.1652485446,7.0624586184,7.447973713,4.5716773702,7.2301967039,6.6604225206,5.1818841331,4.4719991869,4.3973615831,4.2787974327,4.0304523063,7.5038622821,9.6385542169,5.6601719821,6.8048910154,4.1627640753,7.047362421,6.0981807094,4.597241655,2.0267987839,3.1347962382,-0.441403664,-2.190580504,-1.088494612,0.4253056885,2.4976584452,-1.865478288,-1.626181523,-0.199880072,-0.225199865,0.447828034,0.2207018318,0.2190580504,0.6530967672,0.4253056885,0,0,0,-0.199880072,-9.458394325,14.330497089,10.152284264,6.5717415115,8.0548601284,37.852206273,1.8732438339,5.803710229,36.589084257,-0.399760144,-9.68359419,14.778325123,10.372986096,6.7907995619,8.7079568956,38.277511962,1.8732438339,5.803710229,36.589084257,-0.599640216 +050,4,8,08,093,Colorado,Park County,16206,16199,16278,16060,16052,16190,16392,16739,17372,17935,18583,18881,18955,79,-218,-8,138,202,347,633,563,648,298,74,27,115,107,96,97,114,117,115,120,140,138,7,83,77,75,83,90,101,96,97,121,105,20,32,30,21,14,24,16,19,23,19,33,4,1,11,10,5,-2,5,4,6,2,3,51,-253,-48,105,179,318,607,533,616,276,38,55,-252,-37,115,184,316,612,537,622,278,41,4,2,-1,2,4,7,5,7,3,1,0,92,92,92,92,92,92,92,92,92,92,92,92,7.1123755334,6.6641753861,5.9549655729,5.9542078448,6.8817723582,6.8599571986,6.5142889512,6.5721014294,7.4738415546,7.2946400254,5.1332797328,4.7957149975,4.6523168538,5.0948376404,5.4329781775,5.9218433936,5.4380151245,5.3124486555,6.4595344864,5.5502695845,1.9790958006,1.8684603886,1.3026487191,0.8593702044,1.4487941807,0.9381138049,1.0762738267,1.259652774,1.0143070681,1.7443704408,0.0618467438,0.6851021425,0.6203089138,0.3069179301,-0.120732848,0.293160564,0.2265839635,0.3286050715,0.1067691651,0.158579131,-15.64722617,-2.989536622,6.5132435953,10.987661899,19.196522894,35.589692475,30.192313139,33.736787338,14.734144779,2.0086689925,-15.58537943,-2.304434479,7.1335525091,11.294579829,19.075790046,35.882853039,30.418897103,34.065392409,14.840913944,2.1672481235 +050,4,8,08,095,Colorado,Phillips County,4442,4442,4471,4402,4417,4384,4394,4328,4307,4339,4343,4359,4367,29,-69,15,-33,10,-66,-21,32,4,16,8,18,50,54,41,64,56,70,51,42,51,50,8,61,48,50,49,56,44,53,55,39,57,10,-11,6,-9,15,0,26,-2,-13,12,-7,1,42,11,7,-1,11,25,48,62,39,32,17,-100,-3,-31,-6,-78,-72,-14,-46,-35,-17,18,-58,8,-24,-7,-67,-47,34,16,4,15,1,0,1,0,2,1,0,0,1,0,0,60,60,60,60,60,60,60,60,60,60,60,60,11.270145385,12.246286427,9.3171230542,14.581909319,12.841091493,16.213086277,11.797362942,9.6751900484,11.721443346,11.460004584,13.74957737,10.885587935,11.362345188,11.164274322,12.841091493,10.191082803,12.260004626,12.66989173,8.9634566766,13.064405226,-2.479431985,1.3606984919,-2.045222134,3.4176349966,0,6.0220034742,-0.462641684,-2.994701682,2.7579866697,-1.604400642,9.4669221233,2.4946139018,1.5907283263,-0.227842333,2.5223572575,5.790387956,11.103400416,14.282423405,8.9634566766,7.3344029338,-22.54029077,-0.680349246,-7.044654017,-1.367053999,-17.88580601,-16.67631731,-3.238491788,-10.59663672,-8.044127787,-3.896401559,-13.07336865,1.8142646559,-5.45392569,-1.594896332,-15.36344875,-10.88592936,7.8649086283,3.6857866851,0.9193288899,3.4380013752 +050,4,8,08,097,Colorado,Pitkin County,17148,17145,17156,17177,17303,17474,17730,17962,18009,18027,18066,17902,17894,11,21,126,171,256,232,47,18,39,-164,-8,35,175,126,123,131,129,147,162,117,148,129,17,56,48,43,54,54,61,49,69,45,51,18,119,78,80,77,75,86,113,48,103,78,19,68,47,88,88,110,117,97,113,61,45,-27,-167,0,5,89,46,-156,-192,-121,-327,-131,-8,-99,47,93,177,156,-39,-95,-8,-266,-86,1,1,1,-2,2,1,0,0,-1,-1,0,72,72,72,72,72,72,72,72,72,72,72,72,10.194273731,7.3085846868,7.0736406246,7.4423360982,7.2285105906,8.1732506742,8.991008991,6.4832516,8.2295373665,7.2075092189,3.2621675939,2.7842227378,2.4728987549,3.0678332008,3.0258881542,3.3916210281,2.7195027195,3.8234560718,2.5022241993,2.8494803889,6.932106137,4.524361949,4.6007418696,4.3745028974,4.2026224364,4.7816296461,6.2715062715,2.6597955282,5.7273131673,4.35802883,3.9612035068,2.7262180974,5.0608160566,4.9994318827,6.1638462401,6.5052403325,5.3835053835,6.2616019727,3.3919039146,2.5142474019,-9.728249789,0,0.2875463669,5.0562436087,2.5776084277,-8.673653777,-10.65601066,-6.704901227,-18.18282918,-7.319253548,-5.767046282,2.7262180974,5.3483624234,10.055675491,8.7414546677,-2.168413444,-5.272505273,-0.443299255,-14.79092527,-4.805006146 +050,4,8,08,099,Colorado,Prowers County,12551,12551,12546,12500,12422,12319,12064,11937,11937,11990,12038,12106,12106,-5,-46,-78,-103,-255,-127,0,53,48,68,0,40,141,187,168,146,163,183,162,164,148,145,9,149,131,119,103,127,151,123,133,107,123,31,-8,56,49,43,36,32,39,31,41,22,2,18,12,13,15,11,5,4,10,3,0,-39,-55,-150,-167,-321,-177,-36,11,7,24,-22,-37,-37,-138,-154,-306,-166,-31,15,17,27,-22,1,-1,4,2,8,3,-1,-1,0,0,0,315,315,315,315,315,315,315,315,315,315,315,315,11.259282919,15.006821282,13.580696011,11.97555674,13.582767385,15.330485046,13.541187779,13.650740802,12.259774685,11.977531802,11.898107482,10.512799936,9.6196596742,8.4485092072,10.582892379,12.649744492,10.281272203,11.070417846,8.8634857522,10.160251115,-0.638824563,4.4940213466,3.9610363364,3.5270475331,2.9998750052,2.6807405546,3.2599155765,2.5803229566,3.3962889331,1.8172806873,1.4373552663,0.9630045743,1.0508871913,1.2303654185,0.9166284738,0.4188657117,0.3343503155,0.832362244,0.2485089463,0,-4.391918869,-12.03755718,-13.49985853,-26.32981996,-14.74938544,-3.015833124,0.9194633677,0.5826535708,1.9880715706,-1.817280687,-2.954563603,-11.0745526,-12.44897134,-25.09945454,-13.83275697,-2.596967412,1.2538136833,1.4150158149,2.2365805169,-1.817280687 +050,4,8,08,101,Colorado,Pueblo County,159063,159066,159401,160208,160763,161096,161434,163101,164883,166370,167574,168409,169823,335,807,555,333,338,1667,1782,1487,1204,835,1414,504,1865,1880,1854,1919,1877,1853,1787,1826,1840,1803,418,1648,1581,1610,1619,1727,1698,1769,1827,1936,2000,86,217,299,244,300,150,155,18,-1,-96,-197,13,103,63,47,47,81,21,25,52,-11,2,235,492,213,70,29,1437,1607,1442,1154,945,1616,248,595,276,117,76,1518,1628,1467,1206,934,1618,1,-5,-20,-28,-38,-1,-1,2,-1,-3,-7,4321,4321,4319,4485,4464,4375,4369,4390,4488,4467,4337,4077,11.670509904,11.714453954,11.520572673,11.899668248,11.567319395,11.299331675,10.789336248,10.935965312,10.952935119,10.661321223,10.312600709,9.8513572877,10.0043808,10.039376182,10.64291987,10.354163618,10.680657986,10.94195434,11.524392603,11.826202133,1.3579091953,1.8630966661,1.5161918728,1.8602920659,0.9243995255,0.945168057,0.108678261,-0.005989028,-0.571457484,-1.16488091,0.6445375443,0.3925588293,0.2920533526,0.291445757,0.4991757438,0.1280550271,0.1509420292,0.3114294612,-0.065479503,0.0118262021,3.0787618622,1.3272227086,0.4349730783,0.179828233,8.855747454,9.7992585004,8.7063362445,6.911338428,5.6252846126,9.5555713238,3.7232994065,1.7197815379,0.7270264308,0.47127399,9.3549231978,9.9273135275,8.8572782737,7.2227678892,5.5598051092,9.567397526 +050,4,8,08,103,Colorado,Rio Blanco County,6666,6673,6623,6751,6763,6699,6604,6487,6443,6362,6347,6350,6342,-50,128,12,-64,-95,-117,-44,-81,-15,3,-8,22,107,72,79,70,84,76,67,83,50,58,17,41,55,52,58,53,61,44,54,38,49,5,66,17,27,12,31,15,23,29,12,9,10,18,20,5,1,5,5,10,14,10,7,-68,43,-25,-97,-112,-155,-64,-113,-59,-19,-24,-58,61,-5,-92,-111,-150,-59,-103,-45,-9,-17,3,1,0,1,4,2,0,-1,1,0,0,235,235,199,248,249,251,251,251,239,263,262,262,16.001196351,10.655616398,11.736740455,10.523941968,12.833244214,11.755607115,10.464662241,13.061609883,7.8758761912,9.1396155058,6.1312995364,8.1397069705,7.7254494132,8.7198376306,8.0971659919,9.4354215004,6.8723155018,8.4979148635,5.9856659053,7.7213993066,9.8698968147,2.5159094273,4.0112910415,1.8041043374,4.7360782217,2.3201856148,3.5923467396,4.5636950193,1.8902102859,1.4182161992,2.6917900404,2.9598934438,0.7428316743,0.1503420281,0.7638835841,0.7733952049,1.5618898868,2.2031631128,1.5751752382,1.1030570438,6.4303873187,-3.699866805,-14.41093448,-16.83830715,-23.68039111,-9.899458623,-17.64935572,-9.284758832,-2.992832953,-3.781909864,9.1221773591,-0.739973361,-13.66810281,-16.68796512,-22.91650752,-9.126063418,-16.08746583,-7.08159572,-1.417657714,-2.678852821 +050,4,8,08,105,Colorado,Rio Grande County,11982,11982,12022,11914,11867,11674,11505,11355,11354,11300,11274,11277,11296,40,-108,-47,-193,-169,-150,-1,-54,-26,3,19,42,150,136,148,147,129,138,116,127,118,122,14,128,128,130,115,129,130,134,139,106,133,28,22,8,18,32,0,8,-18,-12,12,-11,-1,8,-7,-12,-3,-3,0,2,8,-1,-1,14,-138,-47,-202,-201,-148,-8,-37,-22,-8,32,13,-130,-54,-214,-204,-151,-8,-35,-14,-9,31,-1,0,-1,3,3,1,-1,-1,0,0,-1,198,198,198,198,198,198,198,198,198,198,198,198,12.53342246,11.437702367,12.5738074,12.683894905,11.286089239,12.153771632,10.241017039,11.251882697,10.465167842,10.809374031,10.695187166,10.764896346,11.044560554,9.9227749256,11.286089239,11.449205161,11.830140373,12.315052716,9.400913485,11.783989722,1.8382352941,0.6728060216,1.5292468459,2.7611199793,0,0.7045664714,-1.589123334,-1.063170019,1.0642543568,-0.974615691,0.6684491979,-0.588705269,-1.019497897,-0.258854998,-0.262467192,0,0.1765692593,0.7087800124,-0.088687863,-0.088601426,-11.53074866,-3.952735377,-17.16154794,-17.34328487,-12.94838145,-0.704566471,-3.266531297,-1.949145034,-0.709502905,2.8352456475,-10.86229947,-4.541440646,-18.18104583,-17.60213987,-13.21084864,-0.704566471,-3.089962038,-1.240365022,-0.798190768,2.746644221 +050,4,8,08,107,Colorado,Routt County,23509,23506,23434,23256,23283,23610,24085,24388,24737,25220,25489,25579,25560,-72,-178,27,327,475,303,349,483,269,90,-19,68,229,217,202,210,215,247,232,192,204,189,33,88,92,101,105,101,107,129,119,107,139,35,141,125,101,105,114,140,103,73,97,50,6,29,66,77,86,73,54,41,49,23,20,-122,-352,-167,148,280,116,153,338,146,-30,-92,-116,-323,-101,225,366,189,207,379,195,-7,-72,9,4,3,1,4,0,2,1,1,0,3,335,335,336,308,336,344,334,342,323,323,324,324,9.8093810238,9.3255119362,8.6153583691,8.8059545026,8.8709178305,10.055979644,9.2879876694,7.5726202449,7.9893475366,7.391618921,3.7695437995,3.9536732633,4.3076791845,4.4029772513,4.1672683762,4.3562340967,5.1644414196,4.6934469226,4.1904911099,5.43616418,6.0398372242,5.3718386729,4.3076791845,4.4029772513,4.7036494543,5.6997455471,4.1235462498,2.8791733223,3.7988564267,1.955454741,1.2422360248,2.8363308193,3.2840722496,3.6062480344,3.0119860541,2.1984732824,1.641411614,1.9325957917,0.9007597713,0.7821818964,-15.0781752,-7.176776467,6.3122427654,11.74127267,4.7861696202,6.2290076336,13.531637208,5.7583466446,-1.17490405,-3.598036723,-13.83593917,-4.340445648,9.596315015,15.347520704,7.7981556743,8.427480916,15.173048822,7.6909424363,-0.274144278,-2.815854827 +050,4,8,08,109,Colorado,Saguache County,6108,6108,6135,6187,6331,6240,6195,6250,6413,6632,6837,6829,6938,27,52,144,-91,-45,55,163,219,205,-8,109,17,73,71,76,56,78,76,66,75,45,54,1,37,30,34,47,60,46,48,59,34,60,16,36,41,42,9,18,30,18,16,11,-6,2,19,3,5,6,6,7,7,7,4,5,8,-2,99,-139,-60,31,125,193,181,-23,114,10,17,102,-134,-54,37,132,200,188,-19,119,1,-1,1,1,0,0,1,1,1,0,-4,18,18,18,18,18,18,18,18,18,18,18,18,11.848725856,11.343665122,12.091321295,9.0068355448,12.535154681,12.00347469,10.118819471,11.136684238,6.5856871067,7.8448463718,6.0055185846,4.793097939,5.4092753162,7.5593084037,9.6424266774,7.2652609966,7.3591414335,8.7608582671,4.9758524806,8.7164959686,5.8432072715,6.5505671833,6.6820459788,1.4475271411,2.8927280032,4.7382136934,2.7596780376,2.3758259707,1.6098346261,-0.871649597,3.0839149489,0.4793097939,0.7954816641,0.9650180941,0.9642426677,1.1055831951,1.0732081257,1.0394238622,0.5853944095,0.7263746641,-0.324622626,15.817223199,-22.11439026,-9.650180941,4.98192045,19.742557056,29.589881181,26.876531294,-3.366017855,16.56134234,2.7592923227,16.296532992,-21.3189086,-8.685162847,5.9461631177,20.848140251,30.663089306,27.915955156,-2.780623445,17.287717004 +050,4,8,08,111,Colorado,San Juan County,699,699,708,690,692,692,712,690,691,713,760,723,748,9,-18,2,0,20,-22,1,22,47,-37,25,0,8,3,1,7,7,5,6,3,4,2,1,8,3,3,3,6,3,5,1,4,6,-1,0,0,-2,4,1,2,1,2,0,-4,0,0,0,0,0,0,0,0,0,0,0,9,-18,1,2,17,-24,-2,22,44,-37,30,9,-18,1,2,17,-24,-2,22,44,-37,30,1,0,1,0,-1,1,1,-1,1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,11.444921316,4.3415340087,1.4450867052,9.9715099715,9.9857346648,7.2411296162,8.547008547,4.0733197556,5.3944706676,2.7192386132,11.444921316,4.3415340087,4.3352601156,4.2735042735,8.5592011412,4.3446777697,7.1225071225,1.3577732519,5.3944706676,8.1577158396,0,0,-2.89017341,5.698005698,1.4265335235,2.8964518465,1.4245014245,2.7155465037,0,-5.438477226,0,0,0,0,0,0,0,0,0,0,-25.75107296,1.4471780029,2.8901734104,24.216524217,-34.23680456,-2.896451846,31.339031339,59.742023082,-49.89885367,40.788579198,-25.75107296,1.4471780029,2.8901734104,24.216524217,-34.23680456,-2.896451846,31.339031339,59.742023082,-49.89885367,40.788579198 +050,4,8,08,113,Colorado,San Miguel County,7359,7359,7358,7491,7588,7632,7751,7850,8032,8049,8195,8169,8105,-1,133,97,44,119,99,182,17,146,-26,-64,17,75,72,69,70,67,68,68,49,61,53,7,18,29,25,26,23,26,16,12,22,35,10,57,43,44,44,44,42,52,37,39,18,8,38,17,11,27,36,30,30,43,17,17,-19,37,37,-11,48,19,111,-64,65,-81,-99,-11,75,54,0,75,55,141,-34,108,-64,-82,0,1,0,0,0,0,-1,-1,1,-1,0,9,9,9,9,9,9,9,9,9,9,9,9,10.10169035,9.5497048876,9.0670170828,9.1009556003,8.5891930004,8.5631532553,8.4571854984,6.0329967988,7.4553898802,6.5134570481,2.4244056839,3.8464089131,3.285151117,3.3803549373,2.9485289405,3.2741468329,1.9899259996,1.4774686038,2.6888291371,4.30133956,7.6772846656,5.7032959745,5.7818659658,5.7206006631,5.64066406,5.2890064224,6.4672594988,4.555528195,4.7665607431,2.212117488,5.1181897771,2.2547914318,1.4454664915,3.5103685887,4.6150887764,3.7778617303,3.7311112493,5.2942624969,2.077731606,2.089222072,4.9835005724,4.9074872339,-1.445466491,6.2406552688,2.4357412986,13.978088402,-7.959703999,8.0029549372,-9.899780005,-12.16664618,10.10169035,7.1622786657,0,9.7510238575,7.050830075,17.755950132,-4.228592749,13.297217434,-7.822048399,-10.07742411 +050,4,8,08,115,Colorado,Sedgwick County,2379,2382,2371,2371,2377,2338,2332,2373,2399,2314,2284,2274,2260,-11,0,6,-39,-6,41,26,-85,-30,-10,-14,6,28,21,26,26,23,28,20,21,15,18,14,41,38,29,32,54,36,34,35,26,25,-8,-13,-17,-3,-6,-31,-8,-14,-14,-11,-7,0,3,1,1,2,0,0,0,0,0,0,-3,9,22,-38,0,70,34,-71,-15,2,-7,-3,12,23,-37,2,70,34,-71,-15,2,-7,0,1,0,1,-2,2,0,0,-1,-1,0,35,35,35,35,35,35,35,35,35,35,35,35,11.809363138,8.8458298231,11.028632025,11.13490364,9.7768331562,11.735121542,8.4871631657,9.1344062636,6.5818341378,7.9400088222,17.292281738,16.00673968,12.30116649,13.704496788,22.954303932,15.088013412,14.428177382,15.224010439,11.408512505,11.027790031,-5.4829186,-7.160909857,-1.272534464,-2.569593148,-13.17747078,-3.352891869,-5.941014216,-6.089604176,-4.826678368,-3.087781209,1.2652889076,0.4212299916,0.4241781548,0.8565310493,0,0,0,0,0,0,3.7958667229,9.2670598147,-16.11876988,0,29.755579171,14.249790444,-30.12942924,-6.524575903,0.877577885,-3.087781209,5.0611556305,9.6882898062,-15.69459173,0.8565310493,29.755579171,14.249790444,-30.12942924,-6.524575903,0.877577885,-3.087781209 +050,4,8,08,117,Colorado,Summit County,27994,27994,28075,28048,28307,28741,29333,30064,30573,30848,30771,30851,30631,81,-27,259,434,592,731,509,275,-77,80,-220,63,307,309,248,269,271,295,280,277,253,252,3,54,56,54,69,69,63,70,72,58,75,60,253,253,194,200,202,232,210,205,195,177,35,183,134,59,107,119,105,106,125,49,48,-16,-465,-125,173,274,395,169,-40,-406,-165,-447,19,-282,9,232,381,514,274,66,-281,-116,-399,2,2,-3,8,11,15,3,-1,-1,1,2,273,273,273,273,273,273,273,273,273,273,273,273,10.940256223,10.966196433,8.6944327584,9.2640424286,9.1250399852,9.7300328182,9.1174028427,8.9907333777,8.2113530882,8.1975212257,1.9243447428,1.9874012954,1.8931426167,2.3762785412,2.3233496641,2.077939212,2.2793507107,2.3369415278,1.8824445815,2.43973846,9.0159114801,8.978795138,6.8012901416,6.8877638875,6.8016903211,7.6520936062,6.838052132,6.6537918499,6.3289085067,5.7577827657,6.5213905173,4.7555673853,2.0684335998,3.6849536798,4.0069363773,3.4632320201,3.451588219,4.0571901524,1.5903411119,1.5614326144,-16.5707464,-4.436163606,6.0650680129,9.4362365258,13.300335034,5.5741543942,-1.30248612,-13.17775361,-5.355230275,-14.54084122,-10.04935588,0.3194037796,8.1335016127,13.121190206,17.307271411,9.0373864142,2.1491020986,-9.120563463,-3.764889163,-12.97940861 +050,4,8,08,119,Colorado,Teller County,23350,23360,23474,23378,23456,23372,23458,23421,24098,24713,25158,25408,25529,114,-96,78,-84,86,-37,677,615,445,250,121,51,221,154,165,193,194,190,179,169,169,173,25,132,143,125,173,180,173,149,172,186,218,26,89,11,40,20,14,17,30,-3,-17,-45,0,-6,-6,-6,-6,2,2,-2,-1,-5,-1,84,-181,76,-112,77,-53,653,581,447,274,168,84,-187,70,-118,71,-51,655,579,446,269,167,4,2,-3,-6,-5,0,5,6,2,-2,-1,132,132,132,132,132,132,132,132,132,132,132,132,9.4339622642,6.576418841,7.047065858,8.242579543,8.2766270612,7.9968012795,7.3344123251,6.7774859137,6.6843333465,6.7927047137,5.6347647913,6.1066746381,5.3386862561,7.3884262225,7.6793446959,7.2812980071,6.1051812092,6.8977963145,7.356721908,8.559593223,3.7991974729,0.4697442029,1.7083796019,0.8541533205,0.5972823652,0.7155032724,1.2292311159,-0.120310401,-0.672388561,-1.766888509,-0.256125672,-0.256224111,-0.25625694,-0.256245996,0.0853260522,0.0841768556,-0.081948741,-0.040103467,-0.197761342,-0.039264189,-7.726457782,3.2455054021,-4.783462885,3.288490284,-2.261140383,27.483743345,23.806109279,17.926249724,10.83732152,6.5963837682,-7.982583454,2.9892812914,-5.039719826,3.0322442878,-2.175814331,27.5679202,23.724160538,17.886146257,10.639560179,6.5571195791 +050,4,8,08,121,Colorado,Washington County,4814,4798,4808,4750,4689,4731,4720,4775,4824,4909,4861,4869,4875,10,-58,-61,42,-11,55,49,85,-48,8,6,13,41,40,34,47,48,57,45,54,47,46,5,53,50,41,52,49,68,41,57,40,49,8,-12,-10,-7,-5,-1,-11,4,-3,7,-3,0,5,1,1,1,0,0,-1,-1,-1,-1,3,-50,-54,48,-8,56,60,82,-43,1,10,3,-45,-53,49,-7,56,60,81,-44,0,9,-1,-1,2,0,1,0,0,0,-1,1,0,184,184,184,184,184,184,184,184,184,184,184,184,8.5792006696,8.4754740968,7.2186836518,9.9460374564,10.110584518,11.876237108,9.2468920168,11.054247697,9.6608427544,9.4417077176,11.090186231,10.594342621,8.7048832272,11.004126547,10.321221696,14.168142515,8.4249460598,11.668372569,8.2219938335,10.057471264,-2.510985562,-2.118868524,-1.486199575,-1.058089091,-0.210637177,-2.291905407,0.8219459571,-0.614124872,1.4388489209,-0.615763547,1.0462439841,0.2118868524,0.2123142251,0.2116178182,0,0,-0.205486489,-0.204708291,-0.205549846,-0.205254516,-10.46243984,-11.44189003,10.191082803,-1.692942546,11.795681938,12.501302219,16.84989212,-8.802456499,0.2055498458,2.052545156,-9.416195857,-11.23000318,10.403397028,-1.481324728,11.795681938,12.501302219,16.64440563,-9.00716479,0,1.8472906404 +050,4,8,08,123,Colorado,Weld County,252825,252836,254224,258867,264025,270105,277480,286493,296330,306571,315360,324703,333983,1388,4643,5158,6080,7375,9013,9837,10241,8789,9343,9280,941,3753,3792,3820,3956,4080,4264,4309,4275,4318,4428,368,1444,1454,1566,1616,1724,1741,1835,1879,1882,2042,573,2309,2338,2254,2340,2356,2523,2474,2396,2436,2386,33,408,184,130,270,382,284,296,443,109,96,728,1916,2584,3617,4643,6186,6987,7420,5920,6798,6828,761,2324,2768,3747,4913,6568,7271,7716,6363,6907,6924,54,10,52,79,122,89,43,51,30,0,-30,5895,5895,5893,5723,5721,6132,6393,6306,6302,6064,5998,5724,14.628983942,14.503951103,14.303633947,14.448898345,14.468777761,14.632229682,14.294220776,13.747505752,13.49242184,13.44494949,5.6286311785,5.5613778754,5.8637410368,5.9022800113,6.1137678577,5.974369577,6.087234886,6.0424709493,5.8806711214,6.200222868,9.0003527639,8.9425732274,8.43989291,8.5466183332,8.355009903,8.657860105,8.2069858899,7.7050348029,7.6117507183,7.2447266224,1.590361164,0.7037782181,0.486772883,0.9861482692,1.3546747805,0.9745668925,0.9819190879,1.4245953329,0.340591473,0.2914894198,7.4684607604,9.8834941059,13.543519368,16.95809783,21.937220399,23.9764045,24.614323081,19.03748165,21.241659024,20.732184986,9.0588219244,10.587272324,14.030292251,17.944246099,23.291895179,24.950971393,25.596242169,20.462076983,21.582250497,21.023674406 +050,4,8,08,125,Colorado,Yuma County,10043,10049,10054,10138,10107,10139,10191,10044,10057,9976,9964,10020,10047,5,84,-31,32,52,-147,13,-81,-12,56,27,37,155,156,139,142,140,142,143,135,143,141,14,118,113,92,79,98,101,115,99,91,91,23,37,43,47,63,42,41,28,36,52,50,2,57,9,24,26,13,17,41,61,33,25,-22,-10,-85,-38,-37,-204,-45,-151,-111,-29,-48,-20,47,-76,-14,-11,-191,-28,-110,-50,4,-23,2,0,2,-1,0,2,0,1,2,0,0,196,196,196,196,196,196,196,196,196,196,196,196,15.352614897,15.411212645,13.731107379,13.969503197,13.837410427,14.128650316,14.276443868,13.540621866,14.311449159,14.052922709,11.687797147,11.163250185,9.088214956,7.7717658633,9.6861872992,10.049251281,11.481056257,9.9297893681,9.1072858287,9.0696167838,3.6648177496,4.2479624599,4.6428924232,6.197737334,4.1512231282,4.0793990349,2.7953876104,3.6108324975,5.2041633307,4.9833059252,5.645800317,0.8891084218,2.3708386842,2.5577963601,1.2849023968,1.6914581364,4.0932461439,6.1183550652,3.3026421137,2.4916529626,-0.990491284,-8.397135095,-3.753827917,-3.639940974,-20.16308377,-4.477389185,-15.07512604,-11.1334002,-2.902321857,-4.783973688,4.6553090333,-7.508026673,-1.382989232,-1.082144614,-18.87818137,-2.785931048,-10.9818799,-5.015045135,0.4003202562,-2.292320726 +040,1,1,09,000,Connecticut,Connecticut,3574097,3574151,3579173,3588632,3595211,3595792,3595697,3588561,3579830,3575324,3574561,3566022,3557006,5022,9459,6579,581,-95,-7136,-8731,-4506,-763,-8539,-9016,9497,37637,36854,36134,36162,36324,35917,35501,34958,34596,34258,6848,29295,29064,29755,29669,30378,30111,31112,31141,31469,33477,2649,8342,7790,6379,6493,5946,5806,4389,3817,3127,781,2481,13189,16211,11331,18386,16726,14624,14779,18949,10290,9387,139,-12030,-17369,-17041,-25155,-29948,-29233,-23749,-23606,-22042,-19294,2620,1159,-1158,-5710,-6769,-13222,-14609,-8970,-4657,-11752,-9907,-247,-42,-53,-88,181,140,72,75,77,86,110,118152,121173,120323,118292,118487,117581,115982,114860,113357,110925,110629,110606,10.50168078,10.2602465,10.04978026,10.05688808,10.112109003,10.020937753,9.9231966216,9.7786188169,9.6899650911,9.6189429552,8.1740504938,8.0914908636,8.2756188532,8.2511424268,8.4568232377,8.4010484361,8.6963886452,8.7109093363,8.8141262415,9.399654192,2.3276302857,2.1687556368,1.774161407,1.805745653,1.6552857651,1.6198893169,1.2268079765,1.0677094806,0.8758388496,0.2192887631,3.6800666313,4.5131832642,3.1514379844,5.1132665294,4.6562915753,4.0801345797,4.1310082215,5.3005048333,2.8821176086,2.6356768498,-3.356676137,-4.835573383,-4.739533553,-6.995769583,-8.337117069,-8.15608412,-6.638291782,-6.603183128,-6.173725591,-5.417359022,0.323390494,-0.322390119,-1.588095569,-1.882503053,-3.680825494,-4.07594954,-2.507283561,-1.302678295,-3.291607982,-2.781682172 +050,1,1,09,001,Connecticut,Fairfield County,916829,916910,919371,928099,935293,940189,944524,945323,945096,944107,945511,944388,942426,2461,8728,7194,4896,4335,799,-227,-989,1404,-1123,-1962,2721,10408,10200,10051,10092,10189,10199,9849,9582,9559,9461,1505,6450,6304,6620,6529,6765,6754,6892,6968,6777,7423,1216,3958,3896,3431,3563,3424,3445,2957,2614,2782,2038,814,4689,5554,3792,6133,5193,4716,4850,6002,4225,3386,483,117,-2165,-2223,-5376,-7856,-8416,-8851,-7249,-8161,-7417,1297,4806,3389,1569,757,-2663,-3700,-4001,-1247,-3936,-4031,-52,-36,-91,-104,15,38,28,55,37,31,31,19168,19973,20138,20064,20291,20133,19838,19812,19601,19522,19502,19496,11.267300687,10.947776957,10.718311346,10.709322852,10.782883482,10.790200479,10.426619056,10.14173235,10.1158845,10.028545474,6.9825220437,6.7661554842,7.0595185664,6.9283758323,7.1593097219,7.1455058376,7.2961984498,7.3750355892,7.171811827,7.8682901441,4.2847786432,4.1816214731,3.6587927797,3.7809470195,3.6235737602,3.6446946418,3.1304206059,2.7666967609,2.9440726727,2.1602553299,5.0761311415,5.9611718844,4.043760484,6.5081527002,5.4956829839,4.9893700814,5.1344402904,6.3526067173,4.4711384048,3.5891190123,0.1266597022,-2.323719325,-2.3705906,-5.704847369,-8.313900543,-8.903846184,-9.370088868,-7.672450199,-8.63644036,-7.861930217,5.2027908437,3.6374525596,1.6731698838,0.8033053308,-2.818217559,-3.914476103,-4.235648578,-1.319843482,-4.165301955,-4.272811204 +050,1,1,09,003,Connecticut,Hartford County,894014,894016,895214,896900,897795,897837,897618,896563,894282,893141,892767,891349,889226,1198,1686,895,42,-219,-1055,-2281,-1141,-374,-1418,-2123,2457,9732,9477,9388,9346,9562,9316,9329,9277,9180,9108,1819,7918,7739,7857,7747,8000,7813,8260,8155,8358,8831,638,1814,1738,1531,1599,1562,1503,1069,1122,822,277,694,3784,4533,3266,5392,5098,4446,4511,5936,2678,2671,-40,-3907,-5399,-4749,-7297,-7748,-8259,-6747,-7464,-4940,-5105,654,-123,-866,-1483,-1905,-2650,-3813,-2236,-1528,-2262,-2434,-94,-5,23,-6,87,33,29,26,32,22,34,28227,29057,28523,27493,27597,27102,26817,26554,26033,25029,24972,24967,10.860916214,10.561125985,10.456485516,10.410731542,10.658902307,10.404027149,10.438491616,10.389112989,10.290810687,10.2304031,8.8364914286,8.6243066371,8.7512363335,8.6295674356,8.9177178891,8.7254899224,9.2423561742,9.1326092945,9.3693459394,9.9192676523,2.0244247855,1.9368193481,1.7052491825,1.781164106,1.7411844178,1.6785372268,1.1961354419,1.2565036945,0.9214647478,0.3111354478,4.2229456385,5.051554721,3.6377164141,6.0062769604,5.6828157248,4.9652538327,5.0474901576,6.6475988685,3.0020469521,3.0001544445,-4.360213692,-6.016621209,-5.289502526,-8.12830174,-8.636809776,-9.223578813,-7.549416115,-8.35877324,-5.537756514,-5.734102748,-0.137268053,-0.965066488,-1.651786112,-2.122024779,-2.953994051,-4.258324981,-2.501925957,-1.711174372,-2.535709561,-2.733948303 +050,1,1,09,005,Connecticut,Litchfield County,189927,189876,189762,188979,187591,186866,185380,184171,182837,181719,181151,180396,179610,-114,-783,-1388,-725,-1486,-1209,-1334,-1118,-568,-755,-786,418,1556,1470,1419,1424,1415,1418,1425,1405,1389,1375,372,1669,1746,1818,1819,1760,1792,1833,1871,1886,1973,46,-113,-276,-399,-395,-345,-374,-408,-466,-497,-598,27,125,176,198,316,357,282,266,324,217,191,-178,-795,-1303,-511,-1415,-1224,-1242,-975,-419,-473,-378,-151,-670,-1127,-313,-1099,-867,-960,-709,-95,-256,-187,-9,0,15,-13,8,3,0,-1,-7,-2,-1,2804,2803,2782,2726,2679,2654,2595,2541,2473,2469,2462,2463,8.2166968984,7.8073133813,7.5789743549,7.6508545424,7.6579416643,7.7273519923,7.8177289635,7.7438201009,7.6836483223,7.6387615762,8.8134107477,9.2731763019,9.7100601671,9.7731070314,9.5250723175,9.765454704,10.056068204,10.312233031,10.432945094,10.960928429,-0.596713849,-1.465862921,-2.131085812,-2.122252489,-1.867130653,-2.038102712,-2.23833924,-2.56841293,-2.749296772,-3.322166853,0.6600816917,0.9347531667,1.0575313053,1.6978019912,1.932074328,1.5367512425,1.4593094065,1.7857634966,1.2003971821,1.0610934262,-4.198119559,-6.920360092,-2.729285339,-7.602499422,-6.624254839,-6.768244834,-5.348972449,-2.309366991,-2.61653395,-2.099965001,-3.538037868,-5.985606926,-1.671754033,-5.904697431,-4.692180511,-5.231493591,-3.889663042,-0.523603494,-1.416136768,-1.038871574 +050,1,1,09,007,Connecticut,Middlesex County,165676,165673,165624,166199,165677,165390,164857,163809,163403,163058,163053,162538,161657,-49,575,-522,-287,-533,-1048,-406,-345,-5,-515,-881,357,1534,1481,1364,1380,1367,1301,1259,1271,1287,1274,346,1460,1429,1493,1493,1514,1494,1598,1603,1582,1662,11,74,52,-129,-113,-147,-193,-339,-332,-295,-388,68,318,324,220,358,323,292,261,329,187,180,-112,191,-886,-359,-769,-1224,-499,-261,6,-409,-675,-44,509,-562,-139,-411,-901,-207,0,335,-222,-495,-16,-8,-12,-19,-9,0,-6,-6,-8,2,2,5085,5120,5160,5264,5138,5101,4923,4885,4867,4959,4956,4956,9.2458931418,8.9250201883,8.2400239227,8.3573809906,8.318475291,7.9520310991,7.7130193193,7.7948919233,7.905623927,7.8594672959,8.799872221,8.6116501344,9.0193223728,9.0417172601,9.213000432,9.1316944366,9.7898370709,9.8310084603,9.7177133275,10.253088419,0.4460209208,0.3133700539,-0.77929845,-0.68433627,-0.894525141,-1.179663338,-2.076817752,-2.036116537,-1.812089401,-2.393621123,1.9166844975,1.9525364895,1.3290361166,2.168074199,1.9655212282,1.7847756195,1.5989658795,2.0177178936,1.1486803996,1.1104427891,1.1512161604,-5.33934361,-2.168745299,-4.657120277,-7.44829097,-3.050010391,-1.59896588,0.0367972868,-2.512354457,-4.164160459,3.0679006579,-3.386807121,-0.839709183,-2.489046078,-5.482769742,-1.265234771,0,2.0545151804,-1.363674057,-3.05371767 +050,1,1,09,009,Connecticut,New Haven County,862477,862476,863398,863974,864732,863035,863149,860506,858159,857845,856895,853818,851948,922,576,758,-1697,114,-2643,-2347,-314,-950,-3077,-1870,2258,9265,9047,8912,8985,8802,8842,8749,8597,8513,8397,1716,7565,7579,7584,7679,7830,7769,7822,7828,8098,8512,542,1700,1468,1328,1306,972,1073,927,769,415,-115,551,2880,3766,2722,4516,4024,3480,3482,4586,2185,2089,-66,-3997,-4469,-5783,-5732,-7685,-6911,-4730,-6331,-5700,-3873,485,-1117,-703,-3061,-1216,-3661,-3431,-1248,-1745,-3515,-1784,-105,-7,-7,36,24,46,11,7,26,23,29,29198,29924,30361,29879,29721,29867,29408,29421,29574,28539,28521,28515,10.727278201,10.466788453,10.316205831,10.410245953,10.213180712,10.289381584,10.196945928,10.027176132,9.9525753297,9.8454301469,8.7589702739,8.7684082776,8.7789615151,8.8970816553,9.0853448051,9.0407380147,9.1165288659,9.1302471512,9.467397512,9.9802669299,1.9683079267,1.6983801757,1.5372443159,1.5131642977,1.1278359068,1.2486435693,1.080417062,0.8969289805,0.4851778177,-0.134836783,3.3345451935,4.3570161728,3.1508878223,5.2323506648,4.6691478283,4.0496548193,4.0582655984,5.3489158706,2.5544904376,2.4493394756,-4.627839284,-5.170341284,-6.694189668,-6.641238709,-8.917097679,-8.042288637,-5.512807662,-7.384209851,-6.663888098,-4.541068353,-1.293294091,-0.813325111,-3.543301846,-1.408888044,-4.247949851,-3.992633818,-1.454542064,-2.03529398,-4.109397661,-2.091728877 +050,1,1,09,011,Connecticut,New London County,274055,274076,274019,273086,274173,273093,271593,269818,268639,267829,267089,265784,264999,-57,-933,1087,-1080,-1500,-1775,-1179,-810,-740,-1305,-785,657,2765,2862,2693,2676,2676,2622,2636,2591,2458,2455,547,2235,2332,2388,2360,2462,2429,2533,2523,2510,2768,110,530,530,305,316,214,193,103,68,-52,-313,251,844,1180,638,827,811,585,588,717,324,376,-418,-2316,-569,-2040,-2688,-2825,-1958,-1502,-1525,-1582,-858,-167,-1472,611,-1402,-1861,-2014,-1373,-914,-808,-1258,-482,0,9,-54,17,45,25,1,1,0,5,10,12782,12781,12037,12537,12626,12226,11889,11567,11114,11052,10858,10858,10.10774897,10.459398566,9.8416492163,9.8258446151,9.8852812374,9.7389392282,9.8272403946,9.6874661163,9.2254627275,9.2504846613,8.1702781002,8.5224729059,8.7270175746,8.6655430835,9.0947542625,9.0220760432,9.4432473139,9.4332215405,9.4206311823,10.429874355,1.9374708694,1.9369256604,1.1146316417,1.1603015315,0.7905269749,0.716863185,0.3839930807,0.2542445758,-0.195168455,-1.179389694,3.0853309694,4.312400527,2.3315901225,3.0366119195,2.9958755917,2.1728754571,2.1921158392,2.6807847184,1.2160496028,1.4167748402,-8.466382139,-2.079454152,-7.455241144,-9.869906699,-10.43569488,-7.272632726,-5.599588419,-5.701808501,-5.937624913,-3.232959609,-5.381051169,2.2329463746,-5.123651022,-6.833294779,-7.439819287,-5.099757269,-3.40747258,-3.021023783,-4.72157531,-1.816184769 +050,1,1,09,013,Connecticut,Tolland County,152691,152745,153242,153066,152005,151831,151766,151815,151223,151136,150913,150865,150600,497,-176,-1061,-174,-65,49,-592,-87,-223,-48,-265,338,1183,1126,1127,1131,1195,1106,1204,1135,1158,1156,298,1014,948,990,1011,1027,1008,1098,1095,1130,1151,40,169,178,137,120,168,98,106,40,28,5,46,295,373,287,527,521,445,411,472,371,297,383,-643,-1671,-594,-704,-637,-1142,-604,-738,-449,-570,429,-348,-1298,-307,-177,-116,-697,-193,-266,-78,-273,28,3,59,-4,-8,-3,7,0,3,2,3,16117,16569,16425,15364,15511,15679,15691,15345,15010,14692,14692,14683,7.7242514071,7.3818881506,7.4184757567,7.4506665086,7.8726929551,7.2994145949,7.9640427439,7.5153369155,7.6745157036,7.6692153318,6.6207869204,6.2149466845,6.5166734686,6.6601448631,6.7659043221,6.6526310232,7.2628894791,7.2504792269,7.4889488299,7.6360439852,1.1034644867,1.1669414661,0.9018022881,0.7905216455,1.106788633,0.6467835717,0.7011532648,0.2648576887,0.1855668737,0.0331713466,1.92616582,2.445332398,1.889177056,3.4717075597,3.4323623679,2.9369254021,2.7186225646,3.1253207261,2.458761076,1.9703779875,-4.19838855,-10.95482691,-3.910004081,-4.637726987,-4.196573567,-7.53700856,-3.995250679,-4.886624356,-2.975697367,-3.781533511,-2.27222273,-8.509494511,-2.020827025,-1.166019427,-0.764211199,-4.600083158,-1.276628114,-1.76130363,-0.516936291,-1.811155524 +050,1,1,09,015,Connecticut,Windham County,118428,118379,118543,118329,117945,117551,116810,116556,116191,116489,117182,116884,116540,164,-214,-384,-394,-741,-254,-365,298,693,-298,-344,291,1194,1191,1180,1128,1118,1113,1050,1100,1052,1032,245,984,987,1005,1031,1020,1052,1076,1098,1128,1157,46,210,204,175,97,98,61,-26,2,-76,-125,30,254,305,208,317,399,378,410,583,103,197,87,-680,-907,-782,-1174,-749,-806,-79,114,-328,-418,117,-426,-602,-574,-857,-350,-428,331,697,-225,-221,1,2,14,5,19,-2,2,-7,-6,3,2,4771,4946,4897,4965,4924,4819,4821,4735,4685,4663,4666,4668,10.081394171,10.081515529,10.021401637,9.6261750035,9.5815157307,9.5640330488,9.0252707581,9.4149466558,8.9889176557,8.842278429,8.3082846432,8.3547068234,8.5351768183,8.798392224,8.7416333142,9.0398587307,9.2487536531,9.3978285709,9.6383071441,9.9132908356,1.7731095275,1.7268087051,1.4862248191,0.8277827796,0.8398824165,0.524174318,-0.223482895,0.0171180848,-0.649389488,-1.071012407,2.1446181904,2.5817483092,1.7664843564,2.705228259,3.419521267,3.2481621675,3.5241533436,4.9899217276,0.8800936488,1.6879155528,-5.741497518,-7.677526939,-6.641301763,-10.01873179,-6.419101326,-6.925975415,-0.679044181,0.9757308352,-2.802628319,-3.581465488,-3.596879327,-5.09577863,-4.874817407,-7.313503527,-2.999580059,-3.677813248,2.8451091628,5.9656525628,-1.92253467,-1.893549935 +040,3,5,10,000,Delaware,Delaware,897934,897947,899647,907590,915518,924062,933131,942065,949989,957942,966985,976668,986809,1700,7943,7928,8544,9069,8934,7924,7953,9043,9683,10141,2843,11300,11155,10893,10984,11023,11216,10830,10760,10551,10516,1836,7872,7696,8086,8071,8543,8506,9051,9437,9540,10368,1007,3428,3459,2807,2913,2480,2710,1779,1323,1011,148,400,1675,1352,2504,1901,2402,1834,1714,670,1447,1217,278,2857,3197,3299,4223,4058,3377,4438,7049,7226,8772,678,4532,4549,5803,6124,6460,5211,6152,7719,8673,9989,15,-17,-80,-66,32,-6,3,22,1,-1,4,24413,24346,24757,25196,25194,25210,25065,25020,24975,24891,24938,24938,12.505277393,12.23734414,11.842920667,11.828603705,11.756637706,11.855898405,11.352611808,11.179644735,10.856876202,10.711610067,8.7116410299,8.4427252801,8.7911371074,8.6916114803,9.1115808694,8.991286718,9.4877644946,9.8050471524,9.8165670518,10.560857092,3.7936363631,3.7946188597,3.0517835593,3.1369922243,2.6450568367,2.8646116866,1.8648473137,1.3745975821,1.0403091498,0.1507529755,1.8536583746,1.4831814681,2.7223605388,2.0471754955,2.561865533,1.9386338868,1.7967106777,0.6961302948,1.4889489019,1.2396376428,3.1617325232,3.5071975988,3.5866882658,4.5477233653,4.3280809046,3.5696655592,4.6521598527,7.3239141017,7.4354835971,8.9351695996,5.0153908978,4.990379067,6.3090488046,6.5948988608,6.8899464376,5.508299446,6.4488705304,8.0200443965,8.924432499,10.174807242 +050,3,5,10,001,Delaware,Kent County,162310,162352,162972,165161,167370,169144,171600,173308,174776,176754,178954,181492,183643,620,2189,2209,1774,2456,1708,1468,1978,2200,2538,2151,573,2210,2188,2191,2252,2254,2280,2189,2167,2161,2151,326,1373,1382,1492,1478,1558,1565,1649,1691,1790,1947,247,837,806,699,774,696,715,540,476,371,204,75,255,357,340,290,429,319,200,110,264,201,288,1096,1038,748,1373,595,440,1242,1615,1905,1746,363,1351,1395,1088,1663,1024,759,1442,1725,2169,1947,10,1,8,-13,19,-12,-6,-4,-1,-2,0,4322,4337,4493,4590,4612,4747,4688,4687,4639,4578,4617,4615,13.470147775,13.159675339,13.021746495,13.218134435,13.070152041,13.100286138,12.454129093,12.184151045,11.99070041,11.781943665,8.3685578714,8.3120070009,8.8673873895,8.6751344118,9.0342932028,8.9920823709,9.3818450772,9.5077985314,9.932139627,10.664548729,5.1015899041,4.8476683377,4.1543591054,4.5430000235,4.0358588377,4.1082037669,3.0722840156,2.6763525139,2.058560783,1.1173949361,1.5542478202,2.1471682339,2.0207183059,1.7021576315,2.487619887,1.8328909114,1.1378829687,0.6184848246,1.464851878,1.1009626576,6.6802180823,6.2430269659,4.445580273,8.058835959,3.4501954144,2.528125395,7.0662532359,9.0804817435,10.570237983,9.5635860709,8.2344659025,8.3901951998,6.466298579,9.7609935905,5.9378153015,4.3610163064,8.2041362046,9.6989665681,12.035089861,10.664548729 +050,3,5,10,003,Delaware,New Castle County,538479,538496,538792,542031,545053,548614,551124,553929,555582,556491,557983,559941,561531,296,3239,3022,3561,2510,2805,1653,909,1492,1958,1590,1698,6840,6724,6499,6478,6580,6553,6390,6326,6091,6097,1038,4403,4253,4363,4308,4498,4520,4747,5072,4866,5242,660,2437,2471,2136,2170,2082,2033,1643,1254,1225,855,253,1168,801,1871,1445,1760,1355,1259,500,969,847,-591,-344,-116,-350,-1008,-985,-1724,-1989,-248,-253,-146,-338,824,685,1521,437,775,-369,-730,252,716,701,-26,-22,-134,-96,-97,-52,-11,-4,-14,17,34,17154,17115,17473,17784,17752,17610,17465,17412,17414,17469,17475,17477,12.657021547,12.370709163,11.8847876,11.780987835,11.908931065,11.812411053,11.492051331,11.352440703,10.896984053,10.873209496,8.1474950107,7.8246023306,7.9786626094,7.8345933304,8.1407860075,8.1477335511,8.5372093379,9.1020517302,8.7054218355,9.3484277806,4.5095265367,4.5461068326,3.9061249905,3.9463945049,3.7681450573,3.6646775021,2.9548419933,2.2503889727,2.1915622171,1.5247817155,2.1613159602,1.4736671683,3.4215167871,2.6278986449,3.1853675797,2.4425174694,2.2642398476,0.8972842794,1.7335704395,1.510514752,-0.636551961,-0.213414971,-0.640048571,-1.833163899,-1.782719924,-3.107675363,-3.577103302,-0.445053003,-0.452624686,-0.260372082,1.5247639993,1.2602521976,2.7814682166,0.7947347459,1.4026476558,-0.665157894,-1.312863454,0.4522312768,1.280945753,1.2501426696 +050,3,5,10,005,Delaware,Sussex County,197145,197099,197883,200398,203095,206304,210407,214828,219631,224697,230048,235235,241635,784,2515,2697,3209,4103,4421,4803,5066,5351,5187,6400,572,2250,2243,2203,2254,2189,2383,2251,2267,2299,2268,472,2096,2061,2231,2285,2487,2421,2655,2674,2884,3179,100,154,182,-28,-31,-298,-38,-404,-407,-585,-911,72,252,194,293,166,213,160,255,60,214,169,581,2105,2275,2901,3858,4448,4661,5185,5682,5574,7172,653,2357,2469,3194,4024,4661,4821,5440,5742,5788,7341,31,4,46,43,110,58,20,30,16,-16,-30,2937,2894,2791,2822,2830,2853,2912,2921,2922,2844,2846,2846,11.298555542,11.117912826,10.762117152,10.81804896,10.295483674,10.969964945,10.132154625,9.9704229843,9.8821577406,9.5120263384,10.525232185,10.215790609,10.898903026,10.966833129,11.697061625,11.144895145,11.950631065,11.760437168,12.396756383,13.332774131,0.7733233571,0.9021222177,-0.136785874,-0.148784169,-1.401577951,-0.174930201,-1.818476441,-1.790014184,-2.514598642,-3.820747793,1.2654382208,0.9616028035,1.4313664665,0.7967152295,1.0017990053,0.7365482128,1.1478007238,0.2638841549,0.9198702725,0.7087885587,10.570426407,11.276527722,14.171993581,18.516429852,20.920197068,21.456570125,23.338614717,24.989829465,23.959611677,30.079476587,11.835864628,12.238130525,15.603360047,19.313145081,21.921996073,22.193118338,24.486415441,25.25371362,24.87948195,30.788265146 +040,3,5,11,000,District of Columbia,District of Columbia,601723,601767,605282,620290,635737,651559,663603,677014,687576,697079,704147,708253,712816,3515,15008,15447,15822,12044,13411,10562,9503,7068,4106,4563,2242,9196,9231,9448,9332,9649,9695,9705,9400,9194,9155,1181,4667,4534,4813,4649,4883,4852,5136,4943,5417,6093,1061,4529,4697,4635,4683,4766,4843,4569,4457,3777,3062,757,2666,3610,4980,5460,5298,3710,3855,3055,2751,2143,1465,7709,6797,5972,1817,3266,1969,1055,-444,-2417,-658,2222,10375,10407,10952,7277,8564,5679,4910,2611,334,1485,232,104,343,235,84,81,40,24,0,-5,16,40021,40119,40419,40573,40334,39980,39516,39449,39052,39325,38331,38802,15.006870261,14.69872861,14.678830665,14.191407598,14.394864454,14.209396229,14.017932265,13.416822126,13.018974795,12.884666403,7.6160356144,7.2195900247,7.4776896689,7.0698514708,7.2847054752,7.1112935021,7.4184544164,7.055250188,7.6706315491,8.5752345593,7.390834647,7.4791385854,7.2011409963,7.1215561277,7.110158979,7.0981027268,6.5994778483,6.3615719377,5.3483432455,4.3094318432,4.3506215873,5.7482840735,7.7371482549,8.3031596108,7.9038233888,5.4375306869,5.5681740217,4.3604671909,3.8954970263,3.0160393338,12.580248243,10.823015747,9.278363329,2.7631576946,4.8723833876,2.8858484966,1.52384529,-0.633730747,-3.422543189,-0.926063407,16.930869831,16.571299821,17.015511584,11.066317305,12.776206776,8.3233791835,7.0920193117,3.7267364437,0.4729538374,2.0899759266 +050,3,5,11,001,District of Columbia,District of Columbia,601723,601767,605282,620290,635737,651559,663603,677014,687576,697079,704147,708253,712816,3515,15008,15447,15822,12044,13411,10562,9503,7068,4106,4563,2242,9196,9231,9448,9332,9649,9695,9705,9400,9194,9155,1181,4667,4534,4813,4649,4883,4852,5136,4943,5417,6093,1061,4529,4697,4635,4683,4766,4843,4569,4457,3777,3062,757,2666,3610,4980,5460,5298,3710,3855,3055,2751,2143,1465,7709,6797,5972,1817,3266,1969,1055,-444,-2417,-658,2222,10375,10407,10952,7277,8564,5679,4910,2611,334,1485,232,104,343,235,84,81,40,24,0,-5,16,40021,40119,40419,40573,40334,39980,39516,39449,39052,39325,38331,38802,15.006870261,14.69872861,14.678830665,14.191407598,14.394864454,14.209396229,14.017932265,13.416822126,13.018974795,12.884666403,7.6160356144,7.2195900247,7.4776896689,7.0698514708,7.2847054752,7.1112935021,7.4184544164,7.055250188,7.6706315491,8.5752345593,7.390834647,7.4791385854,7.2011409963,7.1215561277,7.110158979,7.0981027268,6.5994778483,6.3615719377,5.3483432455,4.3094318432,4.3506215873,5.7482840735,7.7371482549,8.3031596108,7.9038233888,5.4375306869,5.5681740217,4.3604671909,3.8954970263,3.0160393338,12.580248243,10.823015747,9.278363329,2.7631576946,4.8723833876,2.8858484966,1.52384529,-0.633730747,-3.422543189,-0.926063407,16.930869831,16.571299821,17.015511584,11.066317305,12.776206776,8.3233791835,7.0920193117,3.7267364437,0.4729538374,2.0899759266 +040,3,5,12,000,Florida,Florida,18801310,18804589,18846143,19055607,19302016,19551678,19853880,20219111,20627237,20977089,21254926,21492056,21733312,41554,209464,246409,249662,302202,365231,408126,349852,277837,237130,241256,50884,213199,214011,212989,218358,221743,226033,222993,223734,220705,219996,41760,174492,173760,181594,181037,191082,193681,199773,206543,211071,230396,9124,38707,40251,31395,37321,30661,32352,23220,17191,9634,-10400,22735,102343,100592,105369,114339,134725,157803,161644,132690,88787,78072,10293,68566,103739,111638,147435,197683,217181,164243,127568,139330,174645,33028,170909,204331,217007,261774,332408,374984,325887,260258,228117,252717,-598,-152,1827,1260,3107,2162,790,745,388,-621,-1061,424999,427016,429151,428207,432397,432418,432919,431977,432544,432371,430403,430318,11.250087397,11.158720654,10.963642222,11.082599059,11.066955297,11.067476583,10.719702562,10.595468864,10.326109104,10.179022652,9.2075959553,9.0599983216,9.3475796664,9.1883992608,9.5366976725,9.4833937174,9.603472485,9.7813471604,9.8753638327,10.660221562,2.0424914417,2.0987223322,1.6160625551,1.8941997979,1.5302576241,1.5840828659,1.1162300767,0.8141217036,0.4507452713,-0.481198911,5.4004366553,5.2449548294,5.4238858215,5.8031915193,6.7239802489,7.7266638379,7.7705380926,6.2838583477,4.1540710406,3.612323208,3.6180915129,5.4090421609,5.746583581,7.4829545619,9.8661465025,10.634047382,7.8954770232,6.0412935542,6.5188227791,8.0806715168,9.0185281682,10.65399699,11.170469402,13.286146081,16.590126751,18.36071122,15.666015116,12.325151902,10.67289382,11.692994725 +050,3,5,12,001,Florida,Alachua County,247336,247337,247624,249879,251596,252585,255606,259215,264127,266501,269190,269489,271218,287,2255,1717,989,3021,3609,4912,2374,2689,299,1729,697,2824,3003,2824,2881,2909,2802,2883,2783,2742,2680,356,1764,1675,1792,1841,1865,1855,1976,2005,2084,2236,341,1060,1328,1032,1040,1044,947,907,778,658,444,281,1251,976,1031,1193,1297,1454,1393,995,791,675,-342,-54,-558,-1082,819,1272,2500,84,918,-1160,585,-61,1197,418,-51,2012,2569,3954,1477,1913,-369,1260,7,-2,-29,8,-31,-4,11,-10,-2,10,25,13920,14036,14142,13306,13270,13373,13851,14802,14540,14602,14605,14597,11.352695361,11.976668827,11.202326149,11.338256679,11.301015304,10.708102923,10.86636966,10.390318299,10.180459977,9.9129473079,7.0914145241,6.6802931353,7.108558236,7.2453073746,7.2452366939,7.0890545762,7.4477788583,7.48565871,7.7374466055,8.2706530524,4.2612808365,5.2963756917,4.0937679127,4.0929493045,4.0557786104,3.619048347,3.4185908018,2.9046595892,2.4430133716,1.6422942555,5.0291154023,3.8925170746,4.0898010833,4.6950851156,5.0386444997,5.556595878,5.2503825656,3.7148281379,2.9368139467,2.4967311316,-0.217084118,-2.225434967,-4.292109381,3.2231975773,4.9415233644,9.5539819086,0.3166059839,3.4273489754,-4.306832084,2.1638336474,4.8120312842,1.6670821078,-0.202308298,7.9182826929,9.9801678642,15.110577787,5.5669885494,7.1421771133,-1.370018137,4.6605647791 +050,3,5,12,003,Florida,Baker County,27115,27115,27067,27055,27059,27008,27123,27357,27903,28255,28381,29288,29566,-48,-12,4,-51,115,234,546,352,126,907,278,82,362,342,312,393,311,356,348,308,348,359,77,228,226,247,209,236,229,257,276,263,284,5,134,116,65,184,75,127,91,32,85,75,-1,9,11,7,4,7,9,11,6,6,6,-57,-155,-120,-122,-68,153,409,249,88,820,194,-58,-146,-109,-115,-64,160,418,260,94,826,200,5,0,-3,-1,-5,-1,1,1,0,-4,3,2344,2339,2317,2346,2368,2347,2406,2637,2720,2726,2835,2831,13.377184879,12.63998226,11.541235874,14.52033031,11.417033774,12.884545784,12.393603761,10.876474327,12.068875826,12.199680565,8.4254092606,8.3527368149,9.1368117336,7.722007722,8.6637298091,8.2880926529,9.152747605,9.7464510206,9.1210182247,9.6510007816,4.951775618,4.2872454448,2.4044241404,6.7983225878,2.7533039648,4.5964531307,3.2408561558,1.1300233067,2.9478576011,2.5486797839,0.3325819445,0.406549137,0.2589379844,0.1477896215,0.2569750367,0.325732899,0.391751843,0.21187937,0.208084066,0.2038943827,-5.727800155,-4.435081495,-4.512919156,-2.512423565,5.6167400881,14.802750633,8.8678371737,3.1075640935,28.438155682,6.5925850409,-5.395218211,-4.028532358,-4.253981172,-2.364633944,5.8737151248,15.128483532,9.2595890167,3.3194434635,28.646239748,6.7964794237 +050,3,5,12,005,Florida,Bay County,168852,168843,169209,169587,171818,174704,178435,181678,183765,184841,186555,173895,171322,366,378,2231,2886,3731,3243,2087,1076,1714,-12660,-2573,518,2112,2286,2280,2246,2398,2327,2341,2363,2007,1894,401,1609,1577,1761,1844,1962,1872,1978,2042,1978,2065,117,503,709,519,402,436,455,363,321,29,-171,84,213,460,317,442,676,616,523,375,225,232,168,-330,1056,2012,2812,2111,1018,199,1016,-12867,-2627,252,-117,1516,2329,3254,2787,1634,722,1391,-12642,-2395,-3,-8,6,38,75,20,-2,-9,2,-47,-7,3817,3814,3735,3928,3947,3840,3988,3867,3883,3918,3649,3645,12.467679666,13.391719512,13.159337647,12.720203659,13.318041837,12.735228202,12.701909356,12.724962035,11.1360799,10.972808407,9.4983411847,9.238294694,10.16385684,10.443479763,10.896579685,10.245099783,10.732326658,10.996348911,10.975169926,11.963489631,2.969338481,4.153424818,2.9954808064,2.2767238963,2.4214621522,2.4901284195,1.9695826981,1.7286131245,0.1609099736,-0.990681224,1.2573938299,2.6947467085,1.829609664,2.5032635874,3.7543770983,3.3712507833,2.8377183225,2.0194078558,1.2484394507,1.3440821281,-1.948074948,6.1862011394,11.612538309,15.925740289,11.724097714,5.571320288,1.079743683,5.4712490172,-71.39409072,-15.21941272,-0.690681118,8.8809478479,13.442147973,18.429003877,15.478474812,8.9425710713,3.9174620055,7.490656873,-70.14565127,-13.87533059 +050,3,5,12,007,Florida,Bradford County,28520,28519,28536,28430,27052,26804,26562,26759,26756,27158,27759,28348,28593,17,-106,-1378,-248,-242,197,-3,402,601,589,245,83,313,327,321,300,281,299,298,283,286,292,90,269,269,291,301,283,291,339,346,302,355,-7,44,58,30,-1,-2,8,-41,-63,-16,-63,0,10,13,2,9,11,9,9,10,6,1,22,-159,-1527,-283,-250,187,-18,433,648,598,309,22,-149,-1514,-281,-241,198,-9,442,658,604,310,2,-1,78,3,0,1,-2,1,6,1,-2,4492,4571,4640,3293,3259,3207,3300,3266,3342,3933,4226,4225,10.989010989,11.787606791,11.920677362,11.243113593,10.539937361,11.174437074,11.054642579,10.30646248,10.194806352,10.256230133,9.4442298915,9.6968386143,10.806595365,11.280590638,10.614954708,10.87545548,12.575583336,12.600833986,10.765145169,12.469046908,1.5447810975,2.0907681771,1.1140819964,-0.037477045,-0.075017348,0.2989815939,-1.520940758,-2.294371506,-0.570338817,-2.212816775,0.3510866131,0.4686204535,0.0742721331,0.3372934078,0.4125954127,0.3363542932,0.3338650443,0.3641859533,0.2138770563,0.0351240758,-5.582277148,-55.04487942,-10.50950683,-9.369261327,7.0141220157,-0.672708586,16.062618244,23.599249777,21.316413282,10.853339422,-5.231190535,-54.57625897,-10.4352347,-9.03196792,7.4267174284,-0.336354293,16.396483288,23.96343573,21.530290338,10.888463497 +050,3,5,12,009,Florida,Brevard County,543376,543376,544000,544442,547119,550478,555838,566133,577380,588165,594978,601024,608459,624,442,2677,3359,5360,10295,11247,10785,6813,6046,7435,1164,5044,5120,5008,5235,5197,5331,5201,5271,5222,5236,1362,6189,6114,6542,6517,7008,7065,7497,7663,7846,8105,-198,-1145,-994,-1534,-1282,-1811,-1734,-2296,-2392,-2624,-2869,260,921,1085,1027,1203,1232,1340,1300,1025,439,489,603,699,2665,3884,5402,10768,11603,11738,8168,8257,9874,863,1620,3750,4911,6605,12000,12943,13038,9193,8696,10363,-41,-33,-79,-18,37,106,38,43,12,-26,-59,7741,7805,7883,6841,7001,6863,6557,6662,6733,6773,6777,6768,9.2682935793,9.3810607011,9.1253893733,9.4638421572,9.264054062,9.3238992473,8.9245803465,8.9101655506,8.7324268689,8.6582448865,11.372218272,11.202305689,11.920586518,11.781444,12.492301494,12.356658822,12.864368171,12.953632824,13.120379397,13.402420704,-2.103924692,-1.821244988,-2.795197144,-2.317601843,-3.228247432,-3.032759575,-3.939787825,-4.043467273,-4.387952529,-4.744175817,1.692327198,1.9879786837,1.8713608,2.1747855043,2.1961351942,2.343655035,2.2307161028,1.7326730581,0.7341124848,0.8086099598,1.2844046812,4.8829153845,7.0772788191,9.7657450493,19.194792022,20.293604008,20.141650473,13.807291257,13.807669218,16.327637511,2.9767318791,6.8708940682,8.9486396191,11.940530554,21.390927216,22.637259043,22.372366575,15.539964315,14.541781703,17.136247471 +050,3,5,12,011,Florida,Broward County,1748066,1748158,1752843,1787096,1814468,1836869,1861259,1885435,1913780,1935945,1948058,1955475,1958105,4685,34253,27372,22401,24390,24176,28345,22165,12113,7417,2630,5070,21127,21165,21156,22092,22157,22578,22379,22120,21885,21491,3742,14462,14229,14409,14028,14778,14808,15414,15321,15613,17369,1328,6665,6936,6747,8064,7379,7770,6965,6799,6272,4122,3158,13791,12411,13155,14284,16963,20596,20955,15867,13198,10567,388,13743,8055,2813,2457,105,85,-5683,-10550,-12072,-12084,3546,27534,20466,15968,16741,17068,20681,15272,5317,1126,-1517,-189,54,-30,-314,-415,-271,-106,-72,-3,19,25,16974,17007,17019,16830,16174,16131,16203,16296,16298,16280,16287,16287,11.936363875,11.753227209,11.588084036,11.947666495,11.827493785,11.885613212,11.626284994,11.390310461,11.212919168,10.982783027,8.1707622645,7.901567208,7.89245145,7.5865410824,7.8885545497,7.7952945543,8.0078447162,7.8892832987,7.9994200126,8.8762718534,3.7656016106,3.851660001,3.6956325861,4.3611254126,3.9389392355,4.0903186579,3.6184402782,3.5010271619,3.2134991558,2.1065111739,7.7916596868,6.8920058064,7.2055797643,7.7249895082,9.0549161474,10.842239778,10.886491892,8.1704365316,6.7620793778,5.4001706877,7.7645405754,4.4730567054,1.5408054639,1.3287803992,0.0560494132,0.0447460857,-2.952418679,-5.432539573,-6.185166105,-6.175419948,15.556200262,11.365062512,8.7463852282,9.0537699074,9.1109655606,10.886985864,7.934073213,2.7378969584,0.5769132732,-0.77524926 +050,3,5,12,013,Florida,Calhoun County,14625,14632,14657,14725,14673,14582,14456,14412,14346,14463,14593,14140,14078,25,68,-52,-91,-126,-44,-66,117,130,-453,-62,41,134,167,127,149,132,142,143,129,130,121,14,162,156,150,156,163,193,175,201,167,159,27,-28,11,-23,-7,-31,-51,-32,-72,-37,-38,1,5,5,4,5,4,18,17,20,1,7,-2,92,-68,-72,-121,-18,-31,131,181,-417,-30,-1,97,-63,-68,-116,-14,-13,148,201,-416,-23,-1,-1,0,0,-3,1,-2,1,1,0,-1,1891,1895,1938,1953,1938,1956,1885,1843,1895,1884,1690,1688,9.1212306855,11.361317096,8.6822765339,10.262414767,9.1450741305,9.8755129008,9.9274532264,8.8794052863,9.0488288727,8.5760861861,11.027159485,10.612966868,10.254657324,10.744541635,11.292780934,13.422352041,12.148981221,13.835352423,11.624264783,11.269402509,-1.9059288,0.7483502279,-1.57238079,-0.482126868,-2.147706803,-3.54683914,-2.221527995,-4.955947137,-2.57543591,-2.693316323,0.3403444286,0.3401591945,0.2734575286,0.3443763345,0.2771234585,1.251825579,1.1801867472,1.3766519824,0.0696063759,0.4961372174,6.2623374855,-4.626165045,-4.922235515,-8.333907294,-1.247055563,-2.15592183,9.0943802284,12.458700441,-29.02585877,-2.12630236,6.6026819141,-4.286005851,-4.648777987,-7.989530959,-0.969932105,-0.904096251,10.274566976,13.835352423,-28.95625239,-1.630165143 +050,3,5,12,015,Florida,Charlotte County,159978,159974,159897,159926,162840,164801,168208,172607,178046,181998,185204,189669,194711,-77,29,2914,1961,3407,4399,5439,3952,3206,4465,5042,260,996,996,1020,1036,1001,1041,1062,1054,984,1002,579,2274,2195,2352,2429,2513,2555,2648,2809,2724,3117,-319,-1278,-1199,-1332,-1393,-1512,-1514,-1586,-1755,-1740,-2115,58,222,249,264,274,317,491,462,302,236,200,211,1094,3730,2974,4394,5517,6430,5051,4649,5999,7009,269,1316,3979,3238,4668,5834,6921,5513,4951,6235,7209,-27,-9,134,55,132,77,32,25,10,-30,-52,3014,2788,2561,3219,3212,3221,3193,3224,3168,3176,2883,2885,6.2284451087,6.1716537677,6.2263269859,6.2220540586,5.8741546,5.9374937616,5.899278977,5.7407094733,5.2497779248,5.2135907175,14.22036564,13.601184759,14.357177521,14.588194313,14.747003506,14.572811298,14.709313306,15.29948094,14.532921816,16.218325615,-7.991920531,-7.429530991,-8.130850535,-8.366140254,-8.872848906,-8.635317536,-8.810034329,-9.558771466,-9.283143891,-11.0047349,1.3882678857,1.5429134419,1.6115199258,1.6456011699,1.8602467614,2.8004893727,2.5663530013,1.6448712153,1.2590930795,1.0406368698,6.8412840853,23.112719431,18.154016134,26.389677156,32.375335593,36.674433129,28.057681839,25.321212847,32.005505865,36.469119101,8.2295519709,24.655632873,19.765536059,28.035278326,34.235582354,39.474922502,30.62403484,26.966084063,33.264598944,37.509755971 +050,3,5,12,017,Florida,Citrus County,141236,141229,141177,139782,139215,138888,138907,140397,142988,145619,147920,150153,153010,-52,-1395,-567,-327,19,1490,2591,2631,2301,2233,2857,243,1061,1065,1011,1035,1022,1059,1029,1102,1032,1029,596,2282,2306,2436,2430,2580,2508,2520,2704,2720,2865,-353,-1221,-1241,-1425,-1395,-1558,-1449,-1491,-1602,-1688,-1836,21,66,71,69,58,66,95,83,46,11,22,284,-224,622,1025,1345,2949,3930,4027,3854,3928,4707,305,-158,693,1094,1403,3015,4025,4110,3900,3939,4729,-4,-16,-19,4,11,33,15,12,3,-18,-36,2251,2251,2251,2250,2252,2252,2253,2251,2251,2251,2250,2253,7.5527034194,7.6344906934,7.2706874791,7.4515380046,7.3181909317,7.4739312243,7.1308041731,7.508371971,6.9244782318,6.7884273477,16.244363057,16.530643699,17.518689119,17.494915315,18.474493742,17.70030171,17.463193893,18.423446288,18.250562782,18.900723373,-8.691659637,-8.896153005,-10.24800164,-10.04337731,-11.15630281,-10.22637049,-10.33238972,-10.91507432,-11.32608455,-12.11229603,0.4698194398,0.5089660462,0.4962190268,0.4175741104,0.4726033283,0.6704659739,0.5751766243,0.3134166159,0.073807423,0.1451364448,-1.594538705,4.4588293064,7.3713696005,9.6833996292,21.116775986,27.736118708,27.906461035,26.258861684,26.355959782,31.052602066,-1.124719265,4.9677953526,7.8675886272,10.10097374,21.589379314,28.406584682,28.48163766,26.5722783,26.429767205,31.19773851 +050,3,5,12,019,Florida,Clay County,190865,190872,191453,192335,193909,195732,198687,202552,207401,212381,215902,219014,221770,581,882,1574,1823,2955,3865,4849,4980,3521,3112,2756,520,2105,2086,2064,2107,2185,2211,2163,2190,2238,2211,332,1482,1487,1531,1562,1705,1682,1773,1905,1913,2104,188,623,599,533,545,480,529,390,285,325,107,116,433,434,295,331,474,438,409,329,139,162,290,-175,571,1021,2076,2898,3877,4174,2909,2658,2498,406,258,1005,1316,2407,3372,4315,4583,3238,2797,2660,-13,1,-30,-26,3,13,5,7,-2,-10,-11,1251,1251,1251,1251,1249,1251,1250,1248,1249,1249,1248,1249,10.969597799,10.801462288,10.594367636,10.684069479,10.891264309,10.786602367,10.305348967,10.226882692,10.291642524,10.032124578,7.7230137472,7.6997959839,7.8585159159,7.9205109287,8.4986753531,8.2058187158,8.4472416635,8.8959869993,8.7971010494,9.5466260118,3.2465840516,3.1016663042,2.7358517199,2.7635585507,2.3925889557,2.5807836508,1.8581073033,1.3308956928,1.4945414747,0.4854985662,2.256454084,2.2472841002,1.5142143666,1.6784181289,2.3626815938,2.1368303196,1.9486304796,1.5363673085,0.6392038922,0.735053904,-0.911961812,2.9566802332,5.2407215873,10.526876241,14.44525582,18.914363354,19.886512523,13.584475685,12.223049968,11.334349704,1.3444922718,5.2039643334,6.7549359539,12.20529437,16.807937414,21.051193673,21.835143003,15.120842994,12.862253861,12.069403608 +050,3,5,12,021,Florida,Collier County,321520,321514,322576,327670,332330,339133,347401,356288,365894,373286,378657,385917,392973,1062,5094,4660,6803,8268,8887,9606,7392,5371,7260,7056,781,3282,3191,3142,3239,3249,3326,3218,3217,3151,3163,751,2854,2972,2926,2978,3136,3179,3420,3520,3679,4286,30,428,219,216,261,113,147,-202,-303,-528,-1123,486,1901,1714,1912,1829,2497,3212,3200,2258,2041,1594,571,2771,2730,4621,6036,6222,6234,4406,3442,5782,6617,1057,4672,4444,6533,7865,8719,9446,7606,5700,7823,8211,-25,-6,-3,54,142,55,13,-12,-26,-35,-32,4546,4546,4545,4546,4546,4545,4545,4545,4546,4547,4544,4547,10.094641105,9.6696969697,9.3586690555,9.4358036164,9.234192946,9.2109745189,8.7069455342,8.5564996283,8.242498437,8.1218143769,8.7782162443,9.0060606061,8.71529779,8.6754625408,8.9130283406,8.8038749235,9.2534971184,9.3624117786,9.6236597112,11.005405128,1.3164248607,0.6636363636,0.6433712654,0.7603410756,0.3211646054,0.4070995954,-0.546551584,-0.80591215,-1.381161274,-2.883590751,5.8470178978,5.1939393939,5.6950271273,5.3282138976,7.0968851297,8.8952646286,8.6582429178,6.0057743739,5.3389207585,4.0930041469,8.5229282456,8.2727272727,13.763975081,17.583979817,17.683948449,17.264346107,11.921318217,9.1549492448,15.124762286,16.990845947,14.369946143,13.466666667,19.459002209,22.912193715,24.780833578,26.159610735,20.579561135,15.160723619,20.463683044,21.083850094 +050,3,5,12,023,Florida,Columbia County,67531,67526,67558,67326,67903,67444,67821,68277,69300,70051,70719,71766,72654,32,-232,577,-459,377,456,1023,751,668,1047,888,193,769,783,781,831,853,793,834,801,788,789,212,745,728,768,803,749,785,766,862,875,926,-19,24,55,13,28,104,8,68,-61,-87,-137,8,37,26,29,16,54,60,62,53,24,26,49,-291,484,-501,340,301,953,621,676,1109,1003,57,-254,510,-472,356,355,1013,683,729,1133,1029,-6,-2,12,0,-7,-3,2,0,0,1,-4,4606,4613,4658,4955,4913,4971,5098,5026,4941,4991,5443,5441,11.402390202,11.580356285,11.54070648,12.2869922,12.535085012,11.528089724,11.969774167,11.380265682,11.060813419,10.926464479,11.046528869,10.766921296,11.348607653,11.872990057,11.00677453,11.411791215,10.993821358,12.246927612,12.281994596,12.823708628,0.3558613327,0.8134349881,0.1920988275,0.4140021439,1.5283104822,0.1162985092,0.9759528098,-0.866661931,-1.221181177,-1.897244149,0.5486195546,0.3845329034,0.4285281536,0.2365726537,0.7935458273,0.872238819,0.8898393266,0.7530013497,0.3368775661,0.3600609334,-4.314818659,7.1582278949,-7.403193274,5.0271688907,4.4232832224,13.854059908,8.9127455131,9.6043191021,15.566550865,13.89004293,-3.766199104,7.5427607983,-6.97466512,5.2637415444,5.2168290497,14.726298727,9.8025848397,10.357320452,15.903428431,14.250103864 +050,3,5,12,027,Florida,DeSoto County,34862,34862,34935,34847,35003,34903,35333,35644,36228,37159,37128,37821,38520,73,-88,156,-100,430,311,584,931,-31,693,699,101,424,382,357,380,372,384,378,353,424,403,53,310,278,300,294,324,298,386,390,354,371,48,114,104,57,86,48,86,-8,-37,70,32,14,171,115,77,89,221,228,182,126,114,103,16,-373,-59,-232,254,46,271,754,-120,509,566,30,-202,56,-155,343,267,499,936,6,623,669,-5,0,-4,-2,1,-4,-1,3,0,0,-2,3798,3794,3776,3804,3835,3835,3761,3748,3785,3574,3591,3583,12.152130922,10.937723694,10.213715561,10.820661769,10.482268904,10.685663402,10.301552046,9.503681667,11.314360432,10.557891565,8.8848127024,7.9599141016,8.5829542529,8.371775158,9.1297180777,8.2925200356,10.519574312,10.499818272,9.446423568,9.7195478183,3.2673182196,2.977809592,1.630761308,2.4488866109,1.3525508263,2.393143366,-0.218022266,-0.996136605,1.8679368637,0.8383437471,4.9009773294,3.2927702219,2.2029582582,2.534312888,6.2273694295,6.3446126447,4.9600065407,3.3922489803,3.0420686067,2.6984189361,-10.69043593,-1.689334288,-6.637484622,7.2327581297,1.2961945419,7.5411843277,20.548598526,-3.230713315,13.582569481,14.828205027,-5.7894586,1.6034359341,-4.434526364,9.7670710177,7.5235639714,13.885796972,25.508605066,0.1615356657,16.624638087,17.526623964 +050,3,5,12,029,Florida,Dixie County,16422,16422,16399,16403,16152,16084,16041,16352,16455,16609,16692,16887,17057,-23,4,-251,-68,-43,311,103,154,83,195,170,36,156,130,179,167,144,145,155,150,152,153,50,209,187,204,244,223,217,226,243,211,235,-14,-53,-57,-25,-77,-79,-72,-71,-93,-59,-82,2,6,2,2,-3,-2,-3,-2,-2,-2,-2,-8,51,-201,-41,40,386,178,226,177,257,255,-6,57,-199,-39,37,384,175,224,175,255,253,-3,0,5,-4,-3,6,0,1,1,-1,-1,1430,1430,1430,1446,1430,1442,1632,1721,1753,1760,1760,1758,9.5116151454,7.986484411,11.105596228,10.39688716,8.8908097428,8.8395769196,9.3757561094,9.0087384763,9.053277346,9.0148479849,12.743125419,11.488250653,12.656657153,15.190661479,13.768406755,13.22888408,13.670457295,14.594156332,12.567378421,13.84633514,-3.231510274,-3.501766242,-1.551060926,-4.793774319,-4.877597012,-4.38930716,-4.294701186,-5.585417855,-3.514101075,-4.831487155,0.3658313517,0.1228689909,0.1240848741,-0.186770428,-0.123483469,-0.182887798,-0.120977498,-0.120116513,-0.11912207,-0.11784115,3.1095664898,-12.34833359,-2.543739918,2.4902723735,23.83230945,10.851342701,13.670457295,10.630311402,15.307186039,15.024746642,3.4753978416,-12.2254646,-2.419655044,2.3035019455,23.708825981,10.668454903,13.549479797,10.510194889,15.188063969,14.906905491 +050,3,5,12,031,Florida,Duval County,864263,864253,865653,872483,880349,886277,897094,911106,927038,939167,950469,959853,966728,1400,6830,7866,5928,10817,14012,15932,12129,11302,9384,6875,3024,12575,12392,12307,12665,12822,13266,13096,13111,13053,12932,1747,7030,7271,7552,7661,7802,7910,8259,8759,9044,9624,1277,5545,5121,4755,5004,5020,5356,4837,4352,4009,3308,664,2655,3253,2940,3114,3831,4501,4270,3088,2289,1978,-440,-1349,-354,-1621,2727,5135,6049,3022,3843,3059,1552,224,1306,2899,1319,5841,8966,10550,7292,6931,5348,3530,-101,-21,-154,-146,-28,26,26,0,19,27,37,19985,20193,20275,20297,20062,20838,21055,21202,20834,20541,20763,20763,14.469523674,14.139404119,13.932773547,14.20343832,14.182059507,14.434124856,14.034899703,13.876746633,13.665758966,13.42481837,8.0891253619,8.2962885205,8.5496307651,8.5915942336,8.6295763743,8.6065074336,8.8511176425,9.2705685116,9.4685607976,9.9907556443,6.3803983118,5.8431155981,5.3831427818,5.6118440863,5.5524831324,5.8276174228,5.1837820604,4.6061781211,4.1971981687,3.4340627256,3.0549968472,3.7117076822,3.3283785023,3.4922626868,4.2373631235,4.8973312211,4.5761317754,3.2683543286,2.3964546291,2.053378498,-1.552237569,-0.403917774,-1.835136582,3.0582531621,5.6796814512,6.5816388705,3.2386581324,4.0674500274,3.2026014462,1.6111443017,1.5027592778,3.307789908,1.4932419199,6.5505158489,9.9170445747,11.478970092,7.8147899079,7.335804356,5.5990560754,3.6645227997 +050,3,5,12,033,Florida,Escambia County,297619,297632,298069,299478,303556,306879,308200,309630,311975,313882,315857,319379,322364,437,1409,4078,3323,1321,1430,2345,1907,1975,3522,2985,1000,3818,3943,3836,3838,3855,3958,3981,3809,3849,3812,751,3008,3024,3235,3082,3338,3332,3280,3559,3732,3925,249,810,919,601,756,517,626,701,250,117,-113,243,403,1316,780,723,926,794,579,175,322,258,-24,202,1803,1907,-95,28,937,636,1542,3076,2836,219,605,3119,2687,628,954,1731,1215,1717,3398,3094,-31,-6,40,35,-63,-41,-12,-9,8,7,4,17959,18041,18483,19617,20915,19758,19680,18089,17849,17923,18008,18012,12.778911115,13.07720626,12.568086692,12.47969773,12.479160934,12.734775299,12.721755928,12.097075137,12.118330825,11.880145167,10.067827301,10.029285248,10.598999074,10.021476916,10.8055614,10.720634487,10.481627592,11.303095409,11.749963793,12.232311065,2.7110838143,3.0479210127,1.9690876178,2.4582208139,1.6735995339,2.0141408129,2.240128336,0.7939797281,0.3683670321,-0.352165898,1.3488478731,4.3645963578,2.5555546455,2.3509175244,2.9975883334,2.5546770055,1.8502629195,0.5557858097,1.0137964473,0.8040601923,0.6760974451,5.9797623351,6.2480034729,-0.308903409,0.09063982,3.0147762647,2.0324131551,4.897266963,9.6845896643,8.8384290908,2.0249453181,10.344358693,8.8035581184,2.0420141153,3.0882281534,5.5694532702,3.8826760746,5.4530527727,10.698386112,9.6424892831 +050,3,5,12,035,Florida,Flagler County,95696,95691,96065,97473,98461,99845,101961,104533,107608,110316,112415,115481,118451,374,1408,988,1384,2116,2572,3075,2708,2099,3066,2970,226,804,874,750,800,815,798,818,784,848,840,226,1037,1108,1228,1186,1207,1289,1314,1345,1498,1560,0,-233,-234,-478,-386,-392,-491,-496,-561,-650,-720,41,221,171,191,115,180,272,280,239,85,100,322,1416,1039,1642,2319,2750,3279,2912,2418,3643,3612,363,1637,1210,1833,2434,2930,3551,3192,2657,3728,3712,11,4,12,29,68,34,15,12,3,-12,-22,684,684,684,684,684,684,684,684,684,684,684,684,8.3084458866,8.9213714822,7.564067653,7.9284064894,7.8936918264,7.5232981838,7.5072043465,7.0398821897,7.4419910837,7.1815741327,10.716241772,11.309930895,12.384900104,11.753862621,11.690412312,12.152294936,12.059250014,12.07734891,13.146347457,13.337209104,-2.407795885,-2.388559413,-4.820832451,-3.825456131,-3.796720486,-4.628996752,-4.552045667,-5.03746672,-5.704356373,-6.155634971,2.28378923,1.7454857248,1.9263158956,1.1397084329,1.7433920598,2.564332213,2.5697031993,2.1460865349,0.7459542949,0.8549493015,14.632785293,10.605612094,16.560265448,22.982468311,26.635156469,30.913401936,26.724913273,21.712289713,31.970723488,30.88076877,16.916574523,12.351097819,18.486581344,24.122176744,28.378548529,33.477734149,29.294616472,23.858376248,32.716677783,31.735718072 +050,3,5,12,037,Florida,Franklin County,11549,11549,11523,11471,11609,11520,11656,11702,11834,11730,11694,12113,12201,-26,-52,138,-89,136,46,132,-104,-36,419,88,27,105,103,105,105,109,106,85,102,93,88,53,127,119,132,129,134,136,129,124,134,141,-26,-22,-16,-27,-24,-25,-30,-44,-22,-41,-53,5,5,9,7,16,13,8,7,5,5,4,-6,-33,140,-69,139,58,153,-65,-19,455,139,-1,-28,149,-62,155,71,161,-58,-14,460,143,1,-2,5,0,5,0,1,-2,0,0,-2,1828,1819,1798,1845,1801,1927,1858,1793,1674,1465,1764,1765,9.1328172567,8.9254766031,9.0795105711,9.0610976873,9.3329908383,9.0074779062,7.2143948396,8.7090163934,7.8128281598,7.238627951,11.04635992,10.311958406,11.414241861,11.13220573,11.473585067,11.556764106,10.948905109,10.587431694,11.257193262,11.598256149,-1.913542663,-1.386481802,-2.33473129,-2.071108043,-2.140594229,-2.5492862,-3.73451027,-1.878415301,-3.444365103,-4.359628198,0.4348960598,0.7798960139,0.6053007047,1.3807386952,1.1131089991,0.6798096533,0.5941266338,0.4269125683,0.4200445247,0.3290285432,-2.870313995,12.131715771,-5.966535518,11.995167415,4.9661786112,13.001359619,-5.516890171,-1.62226776,38.224051749,11.433741877,-2.435417935,12.911611785,-5.361234813,13.37590611,6.0792876102,13.681169273,-4.922763538,-1.195355191,38.644096274,11.76277042 +050,3,5,12,039,Florida,Gadsden County,46389,47737,47792,47372,46571,46084,46113,46057,46069,45984,45933,45670,45277,55,-420,-801,-487,29,-56,12,-85,-51,-263,-393,157,594,582,534,540,560,555,546,546,509,492,70,448,447,498,448,467,481,463,467,506,540,87,146,135,36,92,93,74,83,79,3,-48,19,78,43,64,23,49,65,61,42,34,26,-48,-646,-1013,-597,-83,-194,-126,-228,-171,-300,-369,-29,-568,-970,-533,-60,-145,-61,-167,-129,-266,-343,-3,2,34,10,-3,-4,-1,-1,-1,0,-2,3518,3500,3456,3144,3086,3404,3497,3492,3494,3158,3267,3267,12.483712328,12.390492107,11.526631051,11.714047095,12.15145926,12.048715889,11.862731253,11.880283299,11.113173149,10.819488273,9.4153251229,9.5164088862,10.7495548,9.7183205527,10.133449062,10.442220437,10.059422289,10.16134121,11.047673111,11.875048105,3.0683872052,2.8740832207,0.7770762506,1.9957265421,2.0180101985,1.6064954519,1.8033089633,1.7189420891,0.0655000382,-1.055559832,1.6392753562,0.9154487295,1.38146889,0.4989316355,1.0632526853,1.4111108699,1.325323455,0.9138679461,0.7423337664,0.5717615754,-13.57656257,-21.56626891,-12.88651449,-1.800492424,-4.209612672,-2.735384148,-4.953667996,-3.720748066,-6.550003821,-8.114616205,-11.93728721,-20.65082018,-11.5050456,-1.301560788,-3.146359987,-1.324273278,-3.628344541,-2.80688012,-5.807670054,-7.54285463 +050,3,5,12,041,Florida,Gilchrist County,16939,16944,17006,17002,16908,16972,17007,17394,17607,17899,18263,18572,18885,62,-4,-94,64,35,387,213,292,364,309,313,50,179,189,218,171,195,172,205,185,195,191,18,166,183,194,187,196,180,187,227,205,210,32,13,6,24,-16,-1,-8,18,-42,-10,-19,2,10,7,6,2,7,7,7,7,3,4,30,-27,-107,34,51,379,213,266,398,316,329,32,-17,-100,40,53,386,220,273,405,319,333,-2,0,0,0,-2,2,1,1,1,0,-1,1128,1129,1137,1147,1139,1150,1167,1181,1186,1187,1187,1182,10.526934839,11.147154232,12.868949233,10.065040172,11.336879742,9.8282906203,11.547344111,10.23173497,10.58775621,10.198360787,9.762408845,10.79327632,11.452184179,11.006798317,11.395017587,10.285420417,10.533430969,12.554615342,11.130718067,11.21285741,0.7645259939,0.3538779121,1.4167650531,-0.941758145,-0.058137845,-0.457129796,1.0139131414,-2.322880372,-0.542961857,-1.014496623,0.5880969184,0.4128575641,0.3541912633,0.1177197681,0.4069649138,0.3999885718,0.394299555,0.3871467286,0.1628885571,0.2135782364,-1.58786168,-6.310822766,2.0070838253,3.0018540863,22.034243191,12.171080826,14.98338309,22.012056855,17.157594679,17.566809942,-0.999764761,-5.897965202,2.3612750885,3.1195738544,22.441208104,12.571069398,15.377682645,22.399203584,17.320483236,17.780388178 +050,3,5,12,043,Florida,Glades County,12884,12890,12877,12842,12676,12680,12956,13115,13421,13591,13762,13914,14198,-13,-35,-166,4,276,159,306,170,171,152,284,18,71,73,67,64,69,72,61,66,57,61,8,108,106,115,95,128,118,119,126,117,147,10,-37,-33,-48,-31,-59,-46,-58,-60,-60,-86,16,72,36,17,15,25,30,33,24,18,15,-40,-69,-172,35,287,191,320,192,208,194,356,-24,3,-136,52,302,216,350,225,232,212,371,1,-1,3,0,5,2,2,3,-1,0,-1,1483,1483,1483,1481,1478,1481,1480,1478,1478,1464,1468,1468,5.5212100004,5.7214515244,5.284745228,4.9929786238,5.2932376971,5.4265902924,4.5165111802,4.8257960736,4.1190923544,4.3397837223,8.3984602823,8.3078611176,9.0708313614,7.4114526447,9.819339496,8.8935785348,8.8108988598,9.2128834132,8.4549790432,10.458167331,-2.877250282,-2.586409593,-3.786086133,-2.418474021,-4.526101799,-3.466988242,-4.29438768,-4.38708734,-4.335886689,-6.118383608,5.5989735215,2.8215377381,1.3409055056,1.170229365,1.9178397453,2.2610792885,2.4433585073,1.7548349358,1.3007660066,1.0671599317,-5.365682958,-13.4806803,2.7606878056,22.390388516,14.652295654,24.118179077,14.215904043,15.208569444,14.019366961,25.327262379,0.2332905634,-10.65914257,4.1015933112,23.560617881,16.570135399,26.379258366,16.65926255,16.96340438,15.320132967,26.394422311 +050,3,5,12,045,Florida,Gulf County,15863,15863,15826,15767,15769,15887,16011,15944,16082,16115,16137,13498,13534,-37,-59,2,118,124,-67,138,33,22,-2639,36,26,127,131,118,132,112,128,117,115,118,115,17,155,170,204,163,183,184,186,195,180,196,9,-28,-39,-86,-31,-71,-56,-69,-80,-62,-81,1,2,6,7,6,7,3,3,5,-1,1,-49,-33,35,192,146,-4,192,99,98,-2579,117,-48,-31,41,199,152,3,195,102,103,-2580,118,2,0,0,5,3,1,-1,0,-1,3,-1,3450,3397,3354,3452,3496,3590,3387,3336,3083,2988,399,398,8.0397556421,8.3079654997,7.4551427849,8.2763809643,7.0098576123,7.993505277,7.2677578656,7.1313406921,7.9635566054,8.5084344481,9.8123001931,10.781329274,12.888551933,10.220076494,11.453606634,11.490663836,11.553871479,12.092273347,12.147798212,14.501331755,-1.772544551,-2.473363775,-5.433409148,-1.94369553,-4.443749022,-3.497158559,-4.286113613,-4.960932655,-4.184241606,-5.992897307,0.1266103251,0.3805175038,0.442254233,0.3761991347,0.4381161008,0.1873477799,0.1863527658,0.310058291,-0.067487768,0.0739863865,-2.089070364,2.2196854389,12.13040182,9.1541789454,-0.250352058,11.990257915,6.1496412709,6.0771425028,-174.0509533,8.6564072211,-1.962460039,2.6002029427,12.572656053,9.5303780801,0.1877640432,12.177605695,6.3359940367,6.3872007937,-174.118441,8.7303936076 +050,3,5,12,047,Florida,Hamilton County,14799,14799,14686,14596,14726,14344,14071,14275,14309,14397,14289,14470,14521,-113,-90,130,-382,-273,204,34,88,-108,181,51,41,180,148,136,157,154,150,176,164,159,167,13,125,137,124,156,151,138,148,175,134,146,28,55,11,12,1,3,12,28,-11,25,21,1,12,11,7,6,9,17,21,15,11,12,-154,-157,103,-414,-292,188,6,41,-111,144,16,-153,-145,114,-407,-286,197,23,62,-96,155,28,12,0,5,13,12,4,-1,-2,-1,1,2,3064,2995,2941,3002,2737,2480,2682,2712,2746,2647,2707,2705,12.294242197,10.094809358,9.3567251462,11.050501496,10.865730615,10.495382032,12.262244827,11.434149062,11.057408116,11.520816805,8.5376681921,9.3445194734,8.5311317509,10.980116136,10.654060538,9.6557514694,10.31143315,12.201073694,9.318821934,10.072091339,3.7565740045,0.7502898847,0.8255933953,0.0703853598,0.2116700769,0.8396305626,1.950811677,-0.766924632,1.7385861817,1.4487254665,0.8196161464,0.7502898847,0.4815961472,0.4223121591,0.6350102307,1.1894766303,1.4631087578,1.0458063167,0.76497792,0.8278431237,-10.72331125,7.0254416479,-28.48297214,-20.55252507,13.264658153,0.4198152813,2.8565456699,-7.738966743,10.014256407,1.1037908316,-9.903695103,7.7757315326,-28.00137599,-20.13021292,13.899668384,1.6092919116,4.3196544276,-6.693160427,10.779234327,1.9316339554 +050,3,5,12,049,Florida,Hardee County,27731,27737,27731,27681,27433,27307,27259,27167,27228,27172,27106,26806,26822,-6,-50,-248,-126,-48,-92,61,-56,-66,-300,16,88,406,409,382,394,402,395,373,356,326,330,73,199,195,208,183,237,213,228,231,196,225,15,207,214,174,211,165,182,145,125,130,105,24,121,83,44,-14,19,32,28,41,-16,0,-46,-379,-559,-352,-246,-277,-152,-231,-233,-413,-90,-22,-258,-476,-308,-260,-258,-120,-203,-192,-429,-90,1,1,14,8,1,1,-1,2,1,-1,1,1984,1984,1981,1996,1998,2002,1963,1935,1639,1628,1593,1590,14.653865589,14.841963929,13.956887103,14.441227138,14.77235145,14.523393694,13.713235294,13.117653561,12.09378246,12.307003804,7.1825597344,7.0762419712,7.5995615638,6.7074735183,8.7090728696,7.8316021693,8.3823529412,8.5117358783,7.2711084731,8.3911389573,7.4713058543,7.7657219581,6.3573255389,7.7337536195,6.0632785801,6.691791525,5.3308823529,4.605917683,4.8226739872,3.9158648467,4.3672850646,3.0119388903,1.6075995616,-0.513140051,0.6981957153,1.1765787297,1.0294117647,1.510741,-0.593559875,0,-13.67934743,-20.28522698,-12.86079649,-9.016603746,-10.17895859,-5.588748966,-8.492647059,-8.585430561,-15.32126428,-3.356455583,-9.312062369,-17.27328809,-11.25319693,-9.529743797,-9.480762871,-4.412170236,-7.463235294,-7.074689561,-15.91482416,-3.356455583 +050,3,5,12,051,Florida,Hendry County,39140,39141,39005,38968,37864,37802,38467,39242,40097,41074,41306,42069,42813,-136,-37,-1104,-62,665,775,855,977,232,763,744,156,618,574,602,553,579,620,563,580,612,593,99,277,249,253,298,275,310,300,339,313,363,57,341,325,349,255,304,310,263,241,299,230,40,218,148,174,184,415,629,485,377,332,268,-254,-599,-1655,-596,223,58,-82,231,-386,132,245,-214,-381,-1507,-422,407,473,547,716,-9,464,513,21,3,78,11,3,-2,-2,-2,0,0,1,1942,1857,1753,955,698,697,699,695,698,696,696,696,15.851640953,14.941690962,15.912034467,14.501304593,14.901748832,15.629135734,13.871949342,14.081087643,14.68065967,13.972338069,7.1050235338,6.4816743024,6.6872835884,7.8144462363,7.0776872692,7.814567867,7.391802491,8.2301529497,7.5082458771,8.5530501166,8.7466174189,8.4600166597,9.2247508789,6.6868583566,7.824061563,7.814567867,6.4801468505,5.8509346929,7.1724137931,5.4192879527,5.591679171,3.8525614327,4.599159464,4.8250272063,10.680873515,15.856010285,11.950080694,9.1527069677,7.964017991,6.314648571,-15.36429277,-43.08100791,-15.75344276,5.8477231903,1.4927485877,-2.067079242,5.6916879181,-9.371206604,3.1664167916,5.7727197757,-9.772613597,-39.22844648,-11.1542833,10.672750397,12.173622103,13.788931043,17.641768612,-0.218499636,11.130434783,12.087368347 +050,3,5,12,053,Florida,Hernando County,172778,172778,172978,172877,172777,173721,175411,178036,182668,186899,190851,194290,198792,200,-101,-100,944,1690,2625,4632,4231,3952,3439,4502,370,1520,1439,1437,1500,1518,1623,1577,1566,1607,1607,634,2482,2467,2513,2415,2550,2606,2814,2893,2871,3098,-264,-962,-1028,-1076,-915,-1032,-983,-1237,-1327,-1264,-1491,50,152,109,117,247,300,356,347,391,55,127,408,721,821,1879,2315,3326,5242,5098,4878,4665,5911,458,873,930,1996,2562,3626,5598,5445,5269,4720,6038,6,-12,-2,24,43,31,17,23,10,-17,-45,1828,1828,1828,1768,1836,1835,1826,1786,1815,1831,1834,1832,8.7898107588,8.3262453205,8.2944201698,8.5927385631,8.5896895433,8.9990684883,8.5343117757,8.2911978822,8.3449957288,8.1764110287,14.352835726,14.274389997,14.505134229,13.834309087,14.429320379,14.449520937,15.228632427,15.317008604,14.908825599,15.762614416,-5.563024967,-5.948144676,-6.210714059,-5.241570523,-5.839630836,-5.450452449,-6.694320651,-7.025810721,-6.56382987,-7.586203388,0.8789810759,0.630688492,0.6753285733,1.4149376167,1.6975671034,1.9739176721,1.877873295,2.0701522171,0.2856096858,0.6461756071,4.1693773402,4.750415155,10.845661447,13.261459849,18.82036062,29.065383251,27.589043394,25.826604897,24.22489426,30.075149714,5.0483584161,5.381103647,11.52099002,14.676397466,20.517927723,31.039300923,29.466916689,27.896757114,24.510503945,30.721325321 +050,3,5,12,055,Florida,Highlands County,98786,98786,98637,98493,98244,98118,98636,100204,102058,103828,104453,105890,106639,-149,-144,-249,-126,518,1568,1854,1770,625,1437,749,217,914,901,881,896,939,921,910,877,829,835,413,1393,1443,1488,1428,1458,1488,1641,1710,1606,1807,-196,-479,-542,-607,-532,-519,-567,-731,-833,-777,-972,33,216,209,218,385,467,491,488,421,234,244,35,129,108,274,665,1607,1928,2012,1041,1994,1485,68,345,317,492,1050,2074,2419,2500,1462,2228,1729,-21,-10,-24,-11,0,13,2,1,-4,-14,-8,1733,1733,1733,1733,1733,1733,1734,1737,1734,1734,1733,1734,9.2730685335,9.1594362016,8.973222925,9.1078199173,9.4447797224,9.1069998319,8.8398434085,8.4213154344,7.8823635681,7.8577511775,14.132805763,14.669330121,15.155681853,14.515587993,14.665057333,14.713589305,15.940860476,16.420124735,15.270296611,17.004738177,-4.859737229,-5.509893919,-6.182458928,-5.407768076,-5.22027761,-5.606589473,-7.101017068,-7.998809301,-7.387933043,-9.146986999,2.1914472683,2.1246638914,2.2203888736,3.9135163707,4.6972440153,4.855088944,4.7404874542,4.042615505,2.2249373642,2.2961572303,1.3087810075,1.0979124415,2.7907639971,6.7597100948,16.163749749,19.064381841,19.544796635,9.9961110231,18.959508992,13.974563471,3.5002282758,3.2225763329,5.0111528707,10.673226466,20.860993764,23.919470785,24.285284089,14.038726528,21.184446357,16.270720702 +050,3,5,12,057,Florida,Hillsborough County,1229226,1229207,1233511,1255639,1279861,1304474,1332742,1364645,1398093,1428960,1455351,1476431,1497957,4304,22128,24222,24613,28268,31903,33448,30867,26391,21080,21526,3763,16539,16447,16410,16780,17288,17473,17265,17446,17090,17169,2142,9110,9256,9909,9629,10379,10548,10332,11042,11373,12718,1621,7429,7191,6501,7151,6909,6925,6933,6404,5717,4451,1423,6736,6850,6780,7513,9452,11543,11801,10226,5781,5483,1238,7934,10008,11158,13333,15413,14940,12083,9711,9536,11559,2661,14670,16858,17938,20846,24865,26483,23884,19937,15317,17042,22,29,173,174,271,129,40,50,50,46,33,22065,22052,22079,22334,22230,23147,22817,22367,22970,23462,23504,23501,13.288873712,12.973378032,12.699591965,12.725540873,12.818331222,12.649045983,12.214132526,12.097169827,11.658438451,11.544559755,7.3197677922,7.3011240387,7.6685104679,7.30239768,7.6955957747,7.6359032235,7.3093783527,7.6565945905,7.7584213287,8.5516751681,5.9691059197,5.6722539933,5.0310814968,5.4231431934,5.1227354473,5.0131427591,4.9047541733,4.4405752362,3.9000171227,2.9928845867,5.4122893357,5.4032735161,5.246997777,5.6976751241,7.0082639236,8.3562031579,8.3486231068,7.0907748852,3.9436765762,3.6868088494,6.3748669224,7.8943009268,8.6351034212,10.111420528,11.428096895,10.815357808,8.548124142,6.7336705369,6.5052585765,7.772355187,11.787156258,13.297574443,13.882101198,15.809095652,18.436360819,19.171560966,16.896747249,13.824445422,10.448935153,11.459164036 +050,3,5,12,059,Florida,Holmes County,19927,19924,19844,19841,19704,19604,19578,19292,19426,19458,19512,19661,19594,-80,-3,-137,-100,-26,-286,134,32,54,149,-67,49,201,190,191,184,208,209,184,221,187,192,84,262,236,266,250,249,256,267,275,288,277,-35,-61,-46,-75,-66,-41,-47,-83,-54,-101,-85,1,8,4,1,-2,0,4,8,11,-2,3,-46,51,-92,-24,48,-247,177,107,100,252,15,-45,59,-88,-23,46,-247,181,115,111,250,18,0,-1,-3,-2,-6,2,0,0,-3,0,0,1732,1736,1773,1853,1876,1861,1791,1805,1853,1776,1759,1760,10.129771954,9.6093058541,9.7181235372,9.3920677862,10.702341137,10.796012191,9.4640469088,11.342057993,9.5473923366,9.7821933512,13.203981353,11.935769377,13.534140633,12.760961666,12.811937227,13.223823545,13.733155025,14.11342058,14.70400531,14.112851866,-3.074209399,-2.326463523,-3.816017096,-3.36889388,-2.10959609,-2.427811354,-4.269108116,-2.771362587,-5.156612973,-4.330658515,0.4031750031,0.2023011759,0.0508802279,-0.102087693,0,0.2066222429,0.4114803004,0.5645368232,-0.102111148,0.1528467711,2.5702406451,-4.652927045,-1.221125471,2.4501046399,-12.7090301,9.1430342476,5.5035490176,5.1321529382,12.866004646,0.7642338556,2.9734156482,-4.450625869,-1.170245243,2.3480169466,-12.7090301,9.3496564905,5.915029318,5.6966897614,12.763893498,0.9170806267 +050,3,5,12,061,Florida,Indian River County,138028,138028,138277,139122,140515,141961,144532,147547,151281,154260,157023,159739,162518,249,845,1393,1446,2571,3015,3734,2979,2763,2716,2779,315,1317,1245,1222,1264,1232,1286,1233,1275,1303,1277,409,1745,1716,1847,1893,2064,1990,1991,2070,2231,2416,-94,-428,-471,-625,-629,-832,-704,-758,-795,-928,-1139,38,233,217,260,269,325,319,277,155,140,119,308,1046,1626,1812,2868,3488,4102,3448,3403,3522,3815,346,1279,1843,2072,3137,3813,4421,3725,3558,3662,3934,-3,-6,21,-1,63,34,17,12,0,-18,-16,1794,1795,1794,1646,1321,1321,1321,1322,1326,1327,1327,1326,9.4953478563,8.9044010628,8.6520624761,8.8239503234,8.436073802,8.6069578487,8.0709299243,8.1919025453,8.2269969251,7.9253515052,12.581155664,12.273053995,13.07721718,13.214982565,14.133162603,13.318698382,13.032620827,13.299794721,14.086285602,14.994243725,-3.085807808,-3.368652932,-4.425154703,-4.391032242,-5.697088801,-4.711740533,-4.961690902,-5.107892175,-5.859288677,-7.06889222,1.679890699,1.5520120728,1.8408643566,1.8778818331,2.225425313,2.135007429,1.8131772823,0.9958783486,0.8839444125,0.7385409782,7.541483567,11.629362352,12.829408516,20.021431588,23.883949206,27.453919981,22.569802416,21.864348519,22.237515864,23.676754888,9.2213742659,13.181374425,14.670272873,21.899313421,26.109374519,29.58892741,24.382979698,22.860226868,23.121460276,24.415295866 +050,3,5,12,063,Florida,Jackson County,49746,49763,49651,49204,49111,48885,48737,48617,48325,48288,48089,46257,46085,-112,-447,-93,-226,-148,-120,-292,-37,-199,-1832,-172,122,461,488,505,499,516,526,486,540,469,468,98,539,551,541,577,591,637,646,654,661,668,24,-78,-63,-36,-78,-75,-111,-160,-114,-192,-200,1,21,15,36,47,39,44,38,31,21,20,-142,-391,-43,-225,-110,-80,-224,88,-114,-1664,7,-141,-370,-28,-189,-63,-41,-180,126,-83,-1643,27,5,1,-2,-1,-7,-4,-1,-3,-2,3,1,8009,7917,7824,8374,8096,8152,8065,7853,7806,7725,6321,6313,9.3267917657,9.9272745766,10.306543124,10.223105448,10.600488937,10.85184956,10.060757869,11.205993131,9.9421279122,10.1362327,10.904860654,11.20886945,11.04126699,11.821105898,12.141257678,13.141878649,13.37294153,13.571702792,14.012252772,14.467956076,-1.578068889,-1.281594874,-0.734723866,-1.598000451,-1.540768741,-2.29002909,-3.312183661,-2.365709661,-4.07012486,-4.331723376,0.4248647008,0.3051416366,0.7347238663,0.9628977075,0.8011997453,0.9077592787,0.7866436194,0.6433070131,0.4451699065,0.4331723376,-7.910576096,-0.874739358,-4.592024164,-2.253590379,-1.643486657,-4.621319965,1.8217010133,-2.365709661,-35.27441545,0.1516103182,-7.485711395,-0.569597722,-3.857300298,-1.290692672,-0.842286912,-3.713560686,2.6083446327,-1.722402648,-34.82924554,0.5847826558 +050,3,5,12,065,Florida,Jefferson County,14761,14761,14754,14527,14218,14212,14061,14121,13985,14226,14358,14280,14543,-7,-227,-309,-6,-151,60,-136,241,132,-78,263,30,129,125,145,129,128,119,131,127,115,110,15,173,151,158,153,153,167,179,172,157,170,15,-44,-26,-13,-24,-25,-48,-48,-45,-42,-60,0,1,-3,-1,1,7,36,38,31,30,29,-23,-184,-288,6,-128,77,-122,248,145,-66,297,-23,-183,-291,5,-127,84,-86,286,176,-36,326,1,0,8,2,0,1,-2,3,1,0,-3,1339,1330,1285,1201,1289,1308,1296,1176,1249,1284,1272,1273,8.8111744817,8.6971647243,10.200492438,9.1253139037,9.0838123625,8.467942788,9.2871574918,8.8860901203,8.0312871011,7.6327932554,11.81653632,10.506174987,11.115019346,10.823046723,10.857994465,11.883583576,12.690085428,12.03470473,10.964452825,11.796135031,-3.005361839,-1.809010263,-0.914526908,-1.697732819,-1.774182102,-3.415640788,-3.402927936,-3.14861461,-2.933165724,-4.163341776,0.0683036782,-0.208731953,-0.070348224,0.0707388675,0.4967709886,2.5617305913,2.6939846159,2.1690456199,2.0951183742,2.0122818582,-12.56787678,-20.03826752,0.4220893422,-9.054575036,5.4644808743,-8.681420337,17.581794336,10.145535964,-4.609260423,20.60854179,-12.4995731,-20.24699948,0.3517411185,-8.983836169,5.9612518629,-6.119689746,20.275778951,12.314581584,-2.514142049,22.620823648 +050,3,5,12,067,Florida,Lafayette County,8870,8868,8809,8801,8791,8819,8860,8722,8760,8603,8649,8384,8482,-59,-8,-10,28,41,-138,38,-157,46,-265,98,23,79,81,81,79,64,69,64,61,59,57,22,83,81,68,71,63,74,76,96,71,82,1,-4,0,13,8,1,-5,-12,-35,-12,-25,2,16,1,7,29,52,60,59,87,-2,19,-70,-21,-11,7,7,-195,-17,-208,-5,-252,104,-68,-5,-10,14,36,-143,43,-149,82,-254,123,8,1,0,1,-3,4,0,4,-1,1,0,2094,2022,1953,1823,1788,1804,1727,1705,1467,1484,1262,1259,8.9721749006,9.2087312415,9.199318569,8.937157079,7.2801729041,7.8938336575,7.3719979266,7.0716438674,6.927728527,6.7591604411,9.4264622374,9.2087312415,7.7228847246,8.0321285141,7.1664202025,8.4658505892,8.7542475379,11.129144447,8.3367580579,9.7237044942,-0.454287337,0,1.4764338444,0.905028565,0.1137527016,-0.572016932,-1.382249611,-4.05750058,-1.409029531,-2.964544053,1.817149347,0.11368804,0.7950028393,3.280728548,5.9151404846,6.8642031804,6.7960605886,10.085787155,-0.234838255,2.2530534804,-2.385008518,-1.25056844,0.7950028393,0.7918999943,-22.18177682,-1.944857568,-23.95899326,-0.57964294,-29.58962015,12.332503261,-0.567859171,-1.1368804,1.5900056786,4.0726285423,-16.26663633,4.9193456126,-17.16293267,9.5061442152,-29.8244584,14.585556741 +050,3,5,12,069,Florida,Lake County,297052,297047,297724,300547,303806,308088,315493,325338,335209,345848,357086,366941,375492,677,2823,3259,4282,7405,9845,9871,10639,11238,9855,8551,733,3017,3000,3095,3127,3159,3195,3281,3310,3441,3456,813,3400,3253,3653,3575,3973,3995,4229,4471,4550,4968,-80,-383,-253,-558,-448,-814,-800,-948,-1161,-1109,-1512,123,616,549,678,659,864,1087,1101,1142,292,445,630,2595,2916,4091,6989,9664,9542,10429,11224,10704,9677,753,3211,3465,4769,7648,10528,10629,11530,12366,10996,10122,4,-5,47,71,205,131,42,57,33,-32,-59,3982,3897,3794,3838,3922,3913,3950,3627,3919,3871,3948,3948,10.08573038,9.9279725591,10.116131225,10.029170228,9.8590736091,9.6738006531,9.6350232066,9.4176693687,9.5051703873,9.3099309971,11.366086606,10.765231578,11.939976532,11.46603248,12.399524992,12.096035558,12.418931161,12.720966691,12.568592055,13.383025808,-1.280356227,-0.837259019,-1.823845307,-1.436862252,-2.540451383,-2.422234905,-2.783907955,-3.303297322,-3.063421668,-4.073094811,2.0592674557,1.8168189783,2.2160701036,2.1135987145,2.6964987649,3.2912116776,3.2332095551,3.2492381931,0.8065997539,1.1987613697,8.6749984539,9.6499893274,13.371597041,22.415692588,30.160838037,28.891206833,30.625924115,31.934719334,29.567958101,26.068345561,10.73426591,11.466808306,15.587667145,24.529291303,32.857336802,32.182418511,33.85913367,35.183957527,30.374557855,27.267106931 +050,3,5,12,071,Florida,Lee County,618754,618761,620481,631198,644451,660197,677710,700243,723467,741188,755159,772268,790767,1720,10717,13253,15746,17513,22533,23224,17721,13971,17109,18499,1534,6270,6398,6362,6363,6635,6679,6637,6850,6894,6919,1464,6064,6049,6181,6344,6628,6926,7216,7440,7724,8819,70,206,349,181,19,7,-247,-579,-590,-830,-1900,570,2583,2288,2294,2471,3426,4136,4196,3295,2324,1985,1082,7912,10321,13002,14602,18836,19245,14043,11251,15669,18519,1652,10495,12609,15296,17073,22262,23381,18239,14546,17993,20504,-2,16,295,269,421,264,90,61,15,-54,-105,8486,8486,8486,8480,8474,8474,8473,8468,8478,8480,8477,8476,10.018543093,10.03097247,9.7528222172,9.5118719014,9.6302268655,9.3825287453,9.0628851163,9.1556303451,9.0269453139,8.853288634,9.6893852178,9.4838000108,9.4753527388,9.4834693293,9.6200668673,9.7295095209,9.8535149916,9.9442174843,10.113740297,11.284456202,0.3291578751,0.5471724589,0.2774694784,0.0284025721,0.0101599982,-0.346980776,-0.790629875,-0.788587139,-1.086794983,-2.431167568,4.1272562694,3.5871936559,3.5166573666,3.6938292422,4.9725934049,5.8101720154,5.7296769546,4.4040586842,3.0430259515,2.5399303279,12.642218971,16.181567187,19.931813025,21.828124077,27.339103729,27.035000105,19.175846872,15.037955768,20.516856125,23.696206419,16.769475241,19.768760843,23.448470392,25.52195332,32.311697133,32.845172121,24.905523826,19.442014453,23.559882076,26.236136747 +050,3,5,12,073,Florida,Leon County,275487,275483,275981,278420,283707,282006,283923,286098,286960,291125,291905,293866,295460,498,2439,5287,-1701,1917,2175,862,4165,780,1961,1594,749,3056,2988,3036,3036,3077,3041,3067,3030,2933,2919,349,1656,1669,1864,1703,1823,1759,1903,1989,2045,2175,400,1400,1319,1172,1333,1254,1282,1164,1041,888,744,152,637,664,637,682,709,775,756,528,383,342,-24,402,3159,-3617,-33,248,-1201,2233,-795,683,484,128,1039,3823,-2980,649,957,-426,2989,-267,1066,826,-30,0,145,107,-65,-36,6,12,6,7,24,14994,15123,15262,15091,15288,15108,14873,14253,15098,15129,15014,15011,11.024511139,10.631049567,10.733357727,10.729261091,10.796093477,10.613236357,10.610896321,10.393976296,10.014152288,9.9062318649,5.9740151984,5.938159882,6.589913967,6.0184228057,6.3962555765,6.1389946567,6.5838068796,6.8229765192,6.982250743,7.3813135684,5.0504959407,4.6928896851,4.1434437604,4.7108382854,4.3998379007,4.4742416998,4.0270894419,3.570999777,3.0319015451,2.5249182965,2.297975653,2.3624554594,2.2520253203,2.410196332,2.4876276488,2.704787299,2.6155323179,1.8112275526,1.3076782565,1.1606479266,1.4502138344,11.239453006,-12.7874028,-0.116622403,0.8701433807,-4.191547801,7.7255074946,-2.727132395,2.3319693191,1.6425543757,3.7481894874,13.601908466,-10.53537748,2.2935739289,3.3577710295,-1.486760502,10.341039812,-0.915904842,3.6396475756,2.8032023023 +050,3,5,12,075,Florida,Levy County,40801,40803,40727,40165,39835,39449,39317,39630,39885,40339,40839,41620,42214,-76,-562,-330,-386,-132,313,255,454,500,781,594,112,391,391,372,403,402,392,369,436,438,431,144,536,509,524,491,558,547,564,566,534,604,-32,-145,-118,-152,-88,-156,-155,-195,-130,-96,-173,12,36,22,9,11,28,43,44,52,8,15,-55,-453,-235,-241,-45,437,369,603,578,871,756,-43,-417,-213,-232,-34,465,412,647,630,879,771,-1,0,1,-2,-10,4,-2,2,0,-2,-4,635,620,579,343,341,337,336,334,332,334,333,335,9.6672106018,9.775,9.3839866808,10.232841581,10.184047526,9.8597748852,9.1992421221,10.741826603,10.623461357,10.282224396,13.252237551,12.725,13.218303819,12.467308229,14.136065968,13.758410363,14.060630235,13.944664811,12.951891243,14.409428156,-3.58502695,-2.95,-3.834317138,-2.234466648,-3.952018443,-3.898635478,-4.861388113,-3.202838207,-2.328429886,-4.12720376,0.8900756564,0.55,0.2270319358,0.279308331,0.7093366436,1.0815569389,1.0969285999,1.281135283,0.1940358239,0.357850037,-11.20011868,-5.875,-6.079410726,-1.14262499,11.07071833,9.2812676853,15.032907858,14.240311414,21.125650323,18.035641864,-10.31004302,-5.325,-5.85237879,-0.863316659,11.780054974,10.362824624,16.129836458,15.521446697,21.319686147,18.393491901 +050,3,5,12,077,Florida,Liberty County,8365,8367,8352,8266,8304,8360,8419,8412,8307,8234,8421,8341,8364,-15,-86,38,56,59,-7,-105,-73,187,-80,23,18,80,76,69,90,86,80,83,71,64,66,6,73,68,55,61,76,62,59,82,72,71,12,7,8,14,29,10,18,24,-11,-8,-5,-1,-4,-1,-3,-2,1,-4,-4,-3,-7,-5,-26,-90,31,44,28,-18,-119,-95,200,-65,33,-27,-94,30,41,26,-17,-123,-99,197,-72,28,0,1,0,1,4,0,0,2,1,0,0,1882,1868,1825,1992,2018,2139,2075,2019,1961,2081,2050,2050,9.6281140932,9.1732045866,8.281325012,10.727695333,10.21923831,9.5699503559,10.035668944,8.5259681777,7.6363202482,7.9018258007,8.78565411,8.2076041038,6.601056169,7.2709935038,9.0309547858,7.4167115258,7.1337887673,9.846892825,8.5908602792,8.5004489674,0.8424599832,0.9656004828,1.680268843,3.4567018297,1.1882835244,2.1532388301,2.9018801765,-1.320924647,-0.954540031,-0.598623167,-0.481405705,-0.12070006,-0.360057609,-0.23839323,0.1188283524,-0.478497518,-0.483646696,-0.360252177,-0.835222527,-0.598623167,-10.83162835,3.7417018709,5.2808449352,3.3375052149,-2.138910344,-14.23530115,-11.48660903,24.016811768,-7.755637752,3.9509129003,-11.31303406,3.6210018105,4.920787326,3.0991119852,-2.020081992,-14.71379867,-11.97025573,23.656559592,-8.590860279,3.3522897336 +050,3,5,12,079,Florida,Madison County,19224,19228,19251,19134,18973,18757,18607,18485,18342,18512,18623,18599,18707,23,-117,-161,-216,-150,-122,-143,170,111,-24,108,35,223,219,211,198,205,210,185,177,194,198,25,219,205,245,240,239,240,223,205,246,248,10,4,14,-34,-42,-34,-30,-38,-28,-52,-50,-1,6,4,11,12,32,52,54,41,29,27,16,-128,-180,-197,-116,-119,-165,153,98,-1,132,15,-122,-176,-186,-104,-87,-113,207,139,28,159,-2,1,1,4,-4,-1,0,1,0,0,-1,1933,1957,2004,2026,1986,2020,1974,1925,2048,2046,2024,2022,11.619122053,11.493951243,11.184733634,10.598436998,11.053596463,11.404675917,10.039615781,9.5327857816,10.42394283,10.614914491,11.410707308,10.759178104,12.987012987,12.846590301,12.886875876,13.033915334,12.101807131,11.040797092,13.217989361,13.295448453,0.2084147453,0.7347731388,-1.802279353,-2.248153303,-1.833279413,-1.629239417,-2.06219135,-1.50801131,-2.794046532,-2.680533962,0.312622118,0.2099351825,0.583090379,0.642329515,1.7254394479,2.824014989,2.9304824442,2.2081594183,1.558218258,1.4474883397,-6.669271851,-9.447083213,-10.44261861,-6.209185312,-6.416477947,-8.960816792,8.303033592,5.2780395853,-0.053731664,7.0766096606,-6.356649733,-9.237148031,-9.859528227,-5.566855797,-4.691038499,-6.136801803,11.233516036,7.4861990036,1.5044865939,8.5240980003 +050,3,5,12,081,Florida,Manatee County,322833,322879,323442,327619,333965,342024,351080,362821,375538,385458,394043,402977,411219,563,4177,6346,8059,9056,11741,12717,9920,8585,8934,8242,780,3321,3438,3368,3416,3578,3479,3462,3457,3467,3496,848,3445,3508,3391,3549,3835,3947,4070,4112,4399,4839,-68,-124,-70,-23,-133,-257,-468,-608,-655,-932,-1343,219,1012,962,919,890,1330,1347,1266,866,607,528,421,3288,5300,6999,8043,10516,11776,9213,8354,9286,9099,640,4300,6262,7918,8933,11846,13123,10479,9220,9893,9627,-9,1,154,164,256,152,62,49,20,-27,-42,4817,4817,4817,4817,4816,4815,4814,4813,4812,4807,4811,4814,10.201809047,10.393238047,9.9646591882,9.8571065814,10.023798818,9.4236001728,9.098602358,8.869776947,8.6999071541,8.5876128107,10.582725735,10.604851387,10.032707633,10.24088737,10.743786603,10.691276195,10.69650826,10.550339255,11.038618855,11.886572766,-0.380916688,-0.21161334,-0.068048445,-0.383780789,-0.719987785,-1.267676022,-1.597905902,-1.680562308,-2.338711701,-3.298959956,3.1087716819,2.9081719026,2.718979155,2.5681571597,3.7260068273,3.6486316277,3.3272185399,2.2219342887,1.5231738225,1.2969850012,10.100436057,16.022152894,20.707437547,23.208638242,29.460667516,31.897762471,24.213005062,21.434225229,23.301799202,22.350883571,13.209207739,18.930324796,23.426416702,25.776795402,33.186674343,35.546394098,27.540223602,23.656159517,24.824973025,23.647868572 +050,3,5,12,083,Florida,Marion County,331298,331296,331341,332325,333945,335196,338165,342388,347958,353953,359630,365997,373513,45,984,1620,1251,2969,4223,5570,5995,5677,6367,7516,763,3353,3389,3258,3381,3476,3596,3426,3467,3558,3532,999,4348,4424,4650,4710,4791,4911,5120,5231,5460,5608,-236,-995,-1035,-1392,-1329,-1315,-1315,-1694,-1764,-1902,-2076,114,473,445,471,515,509,758,761,857,88,250,207,1520,2200,2180,3731,4996,6119,6913,6578,8211,9397,321,1993,2645,2651,4246,5505,6877,7674,7435,8299,9647,-40,-14,10,-8,52,33,8,15,6,-30,-55,8244,8232,8183,8602,9163,9220,9322,8951,8860,9010,9213,9218,10.104480266,10.173052967,9.7378579403,10.042161634,10.215222033,10.417964325,9.7619213832,9.7171597418,9.8066913166,9.5522710984,13.102976497,13.279901541,13.898416029,13.989524193,14.07972634,14.227648165,14.588744157,14.661223712,15.049054128,15.166799638,-2.998496232,-3.106848575,-4.160558089,-3.947362559,-3.864504308,-3.80968384,-4.826822774,-4.94406397,-5.242362812,-5.614528539,1.4254157965,1.3357947979,1.4077750429,1.5296401187,1.4958423517,2.1960002665,2.1683660749,2.4019630512,0.2425488577,0.676123379,4.5806173587,6.603929338,6.5158165469,11.08172288,14.682177582,17.727342521,19.697653976,18.436537866,22.63146217,25.41412557,6.0060331552,7.9397241359,7.9235915898,12.611362998,16.178019934,19.923342788,21.866020051,20.838500917,22.874011028,26.090248949 +050,3,5,12,085,Florida,Martin County,146318,146851,146912,147904,149032,151197,153218,155674,158425,159716,160661,161212,162088,61,992,1128,2165,2021,2456,2751,1291,945,551,876,297,1202,1133,1195,1199,1258,1287,1246,1264,1241,1230,452,1675,1682,1811,1863,1919,1920,1948,2014,1957,2210,-155,-473,-549,-616,-664,-661,-633,-702,-750,-716,-980,50,245,128,135,181,202,190,166,141,12,49,182,1225,1537,2595,2456,2892,3189,1829,1564,1266,1818,232,1470,1665,2730,2637,3094,3379,1995,1705,1278,1867,-16,-5,12,51,48,23,5,-2,-10,-11,-11,3933,3922,3885,3858,4081,4183,4102,4205,4147,4203,4215,4216,8.1542385759,7.6312740793,7.9605900829,7.8774042015,8.1452417026,8.1948684969,7.8330048626,7.8907037646,7.7111158749,7.609031859,11.363019646,11.329040601,12.064124385,12.239869914,12.425054712,12.225444844,12.246142434,12.572687802,12.160075558,13.671512527,-3.20878107,-3.697766522,-4.103534302,-4.362465713,-4.279813009,-4.030576347,-4.413137571,-4.681984038,-4.448959683,-6.062480668,1.6620536199,0.8621386427,0.899313524,1.1891661055,1.307900496,1.209809646,1.0435624456,0.8802129991,0.0745635701,0.3031240334,8.3102680994,10.35239917,17.286804406,16.135867155,18.724991259,20.305699795,11.498046464,9.7634973796,7.8664566459,11.24652026,9.9723217193,11.214537813,18.18611793,17.325033261,20.032891755,21.515509441,12.541608909,10.643710379,7.941020216,11.549644293 +050,3,5,12,086,Florida,Miami-Dade County,2496435,2498003,2506986,2544511,2576473,2609570,2634056,2659549,2689890,2709126,2709711,2711612,2707303,8983,37525,31962,33097,24486,25493,30341,19236,585,1901,-4309,7277,31318,31133,30755,31516,32081,32944,32089,31573,30467,30086,4325,18417,18170,18788,18528,19237,20000,20247,20538,20440,23189,2952,12901,12963,11967,12988,12844,12944,11842,11035,10027,6897,8397,36343,35150,38264,39390,44052,50940,53735,40353,36756,28593,-2176,-11693,-16068,-17028,-28178,-31639,-33636,-46547,-50977,-44841,-39667,6221,24650,19082,21236,11212,12413,17304,7188,-10624,-8085,-11074,-190,-26,-83,-106,286,236,93,206,174,-41,-132,41617,41419,41199,40981,42544,41600,41237,41847,42425,42280,42245,42231,12.399492665,12.158991319,11.860680677,12.0206895,12.120662573,12.316805557,11.886980887,11.653053967,11.239691861,11.104067881,7.2916998664,7.0962924313,7.2456013188,7.0668655621,7.2680148972,7.4774195948,7.5002556021,7.5802243175,7.5405947958,8.5585398553,5.1077927988,5.0626988876,4.6150793582,4.9538239379,4.8526476758,4.8393859618,4.3867252848,4.0728296496,3.6990970654,2.5455280254,14.389001914,13.727830433,14.756530171,15.023954798,16.64347831,19.044987708,19.905479072,14.893601708,13.559789741,10.553035063,-4.629518735,-6.275356455,-6.566856465,-10.74752471,-11.95366862,-12.57552427,-17.24277165,-18.81473829,-16.54245652,-14.64020011,9.7594831789,7.4524739777,8.1896737069,4.2764300886,4.6898096855,6.4694634335,2.6627074267,-3.921136583,-2.982666777,-4.087165051 +050,3,5,12,087,Florida,Monroe County,73090,73090,73226,73988,74596,75878,76353,76758,76968,76556,74362,73897,73900,136,762,608,1282,475,405,210,-412,-2194,-465,3,154,720,717,706,771,747,756,714,724,684,675,127,678,635,658,666,739,776,756,756,666,771,27,42,82,48,105,8,-20,-42,-32,18,-96,87,307,368,435,365,411,415,426,262,251,210,28,410,165,765,7,-12,-183,-793,-2430,-730,-113,115,717,533,1200,372,399,232,-367,-2168,-479,97,-6,3,-7,34,-2,-2,-2,-3,6,-4,2,2020,2020,2019,2035,2026,2031,2009,2040,1997,1994,1998,1998,9.781678373,9.6511064448,9.3836809017,10.129342907,9.7576268198,9.8356816674,9.3014772935,9.5946142939,9.2270958255,9.1341502196,9.2110804679,8.5473536855,8.745696931,8.7498604095,9.6531274696,10.095884886,9.8486230166,10.018685644,8.9842775143,10.433229362,0.5705979051,1.1037527594,0.6379839707,1.379482497,0.1044993501,-0.260203219,-0.547145723,-0.42407135,0.2428183112,-1.299079142,4.1707989729,4.9534270177,5.781729734,4.7953439181,5.3686541137,5.3992167883,5.5496209062,3.4720841782,3.3859664506,2.8417356239,5.5701224068,2.2209659183,10.167869532,0.0919654998,-0.156749025,-2.380859451,-10.33063234,-32.20291814,-9.84763151,-1.529124407,9.7409213798,7.174392936,15.949599266,4.8873094179,5.2119050885,3.0183573371,-4.781011438,-28.73083396,-6.461665059,1.3126112167 +050,3,5,12,089,Florida,Nassau County,73314,73314,73526,74166,74546,75428,76309,78022,80168,83024,85923,88583,91113,212,640,380,882,881,1713,2146,2856,2899,2660,2530,189,778,732,766,742,745,841,779,886,842,859,127,707,661,732,728,797,778,880,980,938,1074,62,71,71,34,14,-52,63,-101,-94,-96,-215,12,37,73,2,24,62,55,53,54,-6,14,138,532,247,833,830,1684,2020,2889,2929,2771,2745,150,569,320,835,854,1746,2075,2942,2983,2765,2759,0,0,-11,13,13,19,8,15,10,-9,-14,543,543,543,543,543,543,543,543,543,543,543,543,10.535438615,9.8445317123,10.215103951,9.7800800069,9.6545736113,10.632783362,9.5470366194,10.488496392,9.6500979909,9.5605912207,9.5739782791,8.8896659315,9.7616920266,9.5955501954,10.32844989,9.8362728365,10.784842394,11.601271405,10.750346693,11.953521503,0.9614603364,0.9548657808,0.4534119247,0.1845298115,-0.673876279,0.7965105253,-1.237805775,-1.112775012,-1.100248702,-2.392930282,0.5010427105,0.9817634085,0.0266712897,0.3163368196,0.803467871,0.6953663316,0.6495416442,0.6392537305,-0.068765544,0.1558187161,7.2041816754,3.3218570122,11.108592156,10.939981679,21.823224109,25.538908907,35.40614736,34.673595861,31.758220348,30.551598255,7.7052243859,4.3036204207,11.135263446,11.256318498,22.62669198,26.234275239,36.055689004,35.312849592,31.689454804,30.707416971 +050,3,5,12,091,Florida,Okaloosa County,180822,180824,180725,183205,189957,192969,195074,198310,200912,204275,207731,211411,212820,-99,2480,6752,3012,2105,3236,2602,3363,3456,3680,1409,611,2609,2672,2594,2784,2880,2794,2719,2765,2676,2733,315,1511,1501,1618,1600,1804,1817,1802,1869,1956,2085,296,1098,1171,976,1184,1076,977,917,896,720,648,196,211,906,512,504,707,604,405,135,147,158,-619,1168,4514,1504,445,1442,1021,2028,2417,2810,594,-423,1379,5420,2016,949,2149,1625,2433,2552,2957,752,28,3,161,20,-28,11,0,13,8,3,9,4883,4819,4798,5040,4942,4679,4982,5015,5157,5293,5219,5221,14.337922128,14.320857965,13.548309595,14.348925248,14.642181685,13.997224602,13.420963654,13.422134629,12.768942268,12.884489818,8.3037946858,8.0447634003,8.4507189379,8.2465087632,9.1716999166,9.1027047608,8.8946585157,9.0726834075,9.3333524199,9.82955041,6.0341274421,6.2760945648,5.0975906572,6.1024164848,5.4704817685,4.8945198411,4.5263051381,4.3494512216,3.4355898478,3.054939408,1.1595636524,4.8557998939,2.6741459185,2.5976502604,3.5944522401,3.025885347,1.9990769694,0.6553302622,0.7014329273,0.7448772013,6.4188168054,24.193245829,7.8553036357,2.2935602498,7.3312590243,5.114948575,10.010192825,11.732838842,13.408343712,2.800361124,7.5783804578,29.049045723,10.529449554,4.8912105102,10.925711264,8.140833922,12.009269794,12.388169104,14.109776639,3.5452383253 +050,3,5,12,093,Florida,Okeechobee County,39996,39987,40014,39854,39693,39464,39550,39833,40767,41248,41601,42141,42297,27,-160,-161,-229,86,283,934,481,353,540,156,126,548,537,502,565,514,522,516,546,525,529,80,419,390,405,419,427,451,479,481,470,498,46,129,147,97,146,87,71,37,65,55,31,7,63,60,38,43,95,114,105,66,56,46,-20,-353,-369,-368,-94,106,746,338,223,430,77,-13,-290,-309,-330,-51,201,860,443,289,486,123,-6,1,1,4,-9,-5,3,1,-1,-1,2,2503,2503,2502,2504,2644,2648,2633,2911,3011,2990,3029,3024,13.72264236,13.501451972,12.683654004,14.301263067,12.949875918,12.952853598,12.583064074,13.18060568,12.538511141,12.529903598,10.492312315,9.8055237784,10.23282843,10.605715443,10.75797085,11.191066998,11.680790099,11.611485956,11.224952831,11.795637035,3.2303300446,3.6959281934,2.4508255745,3.6955476245,2.1919050678,1.7617866005,0.9022739743,1.5691197238,1.31355831,0.7342665624,1.577603045,1.5085421198,0.9601172354,1.0884147113,2.3934595568,2.8287841191,2.5605072243,1.5932600273,1.3374411884,1.0895568346,-8.839585316,-9.277534036,-9.297977437,-2.379325183,2.6705969792,18.511166253,8.2423946839,5.3832876679,10.269637697,1.823823397,-7.261982271,-7.768991917,-8.337860202,-1.290910472,5.064056536,21.339950372,10.802901908,6.9765476952,11.607078885,2.9133802316 +050,3,5,12,095,Florida,Orange County,1145956,1145949,1148590,1170699,1202716,1227761,1257031,1291844,1327775,1357720,1383657,1395371,1404396,2641,22109,32017,25045,29270,34813,35931,29945,25937,11714,9025,3653,15063,15655,15787,16083,16383,16737,16738,16995,16774,16684,1553,6829,6837,7199,7246,7499,7846,8098,8443,8800,9545,2100,8234,8818,8588,8837,8884,8891,8640,8552,7974,7139,1729,9476,9300,9886,12161,14575,17253,18208,18132,7680,8377,-1159,4392,13472,6573,8221,11268,9759,3101,-731,-3981,-6553,570,13868,22772,16459,20382,25843,27012,21309,17401,3699,1824,-29,7,427,-2,51,86,28,-4,-16,41,62,33704,33422,33125,34077,34728,34993,35097,34863,35218,35212,35767,35766,12.989325608,13.191961793,12.990865579,12.945147924,12.855083125,12.778194081,12.465485879,12.398878374,12.071846703,11.918134616,5.8888737022,5.7613186063,5.9239400332,5.8322789191,5.8841645824,5.9901840688,6.0309179499,6.1596781472,6.333149576,6.8184245332,7.1004519057,7.4306431871,7.0669255459,7.1128690047,6.9709185425,6.7880100121,6.4345679288,6.2392002267,5.7386971272,5.099710083,8.171469791,7.8368089862,8.1350286384,9.788344457,11.436418028,13.172144499,13.560256117,13.228388507,5.5271123573,5.9840693886,3.7873675941,11.352418351,5.4088148129,6.6170528559,8.8415477417,7.4507018005,2.3094438828,-0.533308626,-2.865030507,-4.68110382,11.958837385,19.189227337,13.543843451,16.405397313,20.277965769,20.622846299,15.869699999,12.695079881,2.6620818502,1.3029655682 +050,3,5,12,097,Florida,Osceola County,268685,268685,269841,278669,288932,299322,311150,323860,338182,353306,367359,374170,385315,1156,8828,10263,10390,11828,12710,14322,15124,14053,6811,11145,889,3752,3785,3878,4080,4173,4266,4356,4467,4407,4493,444,1693,1731,1870,1939,2047,2107,2241,2494,2564,2723,445,2059,2054,2008,2141,2126,2159,2115,1973,1843,1770,603,3504,3644,3772,4871,5503,5936,6453,8082,1203,2594,137,3253,4470,4530,4723,5032,6203,6527,3989,3762,6807,740,6757,8114,8302,9594,10535,12139,12980,12071,4965,9401,-29,12,95,80,93,49,24,29,9,3,-26,3262,3281,3299,3324,3276,3269,3268,3275,3246,3283,3289,3288,13.68069862,13.336833445,13.184780724,13.366706417,13.143100109,12.887399893,12.598917118,12.396883434,11.886251246,11.831701745,6.1730870905,6.0993550047,6.357797822,6.3524617018,6.4471425647,6.3651550808,6.4816743024,6.9213851096,6.9154409335,7.1706485316,7.5076115294,7.23747844,6.8269829019,7.0142447156,6.695957544,6.5222448123,6.1172428155,5.4754983245,4.9708103122,4.6610532137,12.776430694,12.840005567,12.824392184,15.958143862,17.33201052,17.932397038,18.664098292,22.429284064,3.2446472087,6.8309446533,11.861224043,15.750500792,15.401510232,15.473273139,15.848569314,18.73899239,18.878129483,11.070330875,10.146602493,17.925304647,24.637654737,28.590506359,28.225902416,31.431417002,33.180579833,36.671389428,37.542227775,33.499614939,13.391249702,24.756249301 +050,3,5,12,099,Florida,Palm Beach County,1320134,1320124,1323631,1336875,1355149,1376782,1399064,1424772,1451469,1470583,1482833,1497800,1507600,3507,13244,18274,21633,22282,25708,26697,19114,12250,14967,9800,3335,13662,14029,14021,14335,14565,15033,15014,15046,14907,14865,3264,13049,13064,13583,13491,14465,14511,14673,15006,15232,16781,71,613,965,438,844,100,522,341,40,-325,-1916,1473,7293,6996,8073,8449,10042,11898,12004,8969,7544,5962,1982,5397,10234,13006,12866,15505,14292,6845,3335,7790,5715,3455,12690,17230,21079,21315,25547,26190,18849,12304,15334,11677,-19,-59,79,116,123,61,-15,-76,-94,-42,39,19972,20743,21531,20727,20964,20788,21038,21449,21642,21869,21854,21850,10.270226791,10.422641106,10.2645345,10.328382771,10.315754881,10.453226972,10.276340051,10.188879589,10.002573279,9.8921940507,9.8094121945,9.7057084186,9.9438821844,9.7202798714,10.244929238,10.090253216,10.042942425,10.161792311,10.220647762,11.167232315,0.4608145969,0.7169326871,0.3206523152,0.6081028991,0.0708256428,0.3629737564,0.2333976261,0.0270872779,-0.218074483,-1.275038264,5.482415751,5.1975762475,5.9101053431,6.0875135004,7.1123110549,8.273298378,8.2161439974,6.0736448912,5.0620119954,3.9675251214,4.0571229683,7.6032011602,9.5214703446,9.2699667056,10.981515924,9.9379711227,4.6850637839,2.2584017964,5.227077604,3.8031543222,9.5395387193,12.800777408,15.431575688,15.357480206,18.093826979,18.211269501,12.901207781,8.3320466876,10.289089599,7.7706794437 +050,3,5,12,101,Florida,Pasco County,464697,464707,465516,466529,469755,474501,483590,495130,510319,525533,539129,554032,570412,809,1013,3226,4746,9089,11540,15189,15214,13596,14903,16380,1121,4774,4694,4799,4834,4944,5147,5054,5181,5070,5194,1229,5548,5437,5709,5566,5916,6018,6043,6403,6698,7082,-108,-774,-743,-910,-732,-972,-871,-989,-1222,-1628,-1888,161,842,731,697,797,994,1260,1257,1023,473,495,755,968,3235,4896,8810,11386,14733,14882,13762,16107,17889,916,1810,3966,5593,9607,12380,15993,16139,14785,16580,18384,1,-23,3,63,214,132,67,64,33,-49,-116,5674,5687,5699,5794,5826,5884,5909,5971,5854,5804,5795,5798,10.244140573,10.026872188,10.164616375,10.090899507,10.102991663,10.238211983,9.7581507783,9.7326663298,9.2758523218,9.2383435725,11.905004587,11.613997462,12.09205978,11.618938076,12.089259441,11.970771267,11.667689979,12.028230556,12.254370582,12.596447667,-1.660864014,-1.587125274,-1.927443405,-1.528038568,-1.986267778,-1.732559284,-1.909539201,-2.295564226,-2.97851826,-3.358104094,1.8067797156,1.5614920259,1.4762945642,1.6637250533,2.0312244564,2.5063429373,2.4269876392,1.9217366638,0.8653803054,0.8804351306,2.0771529272,6.9102964485,10.370069134,18.390737414,23.267124407,29.306309917,28.733834563,25.852336234,29.468669299,31.818392023,3.8839326427,8.4717884744,11.846363698,20.054462468,25.298348864,31.812652855,31.160822202,27.774072898,30.334049605,32.698827154 +050,3,5,12,103,Florida,Pinellas County,916542,916799,916428,918574,921863,928755,936862,947664,960527,968886,973343,975367,976802,-371,2146,3289,6892,8107,10802,12863,8359,4457,2024,1435,1924,8497,8287,8404,8667,8665,8628,8273,8280,7967,7928,2683,11390,11029,11524,11363,11874,11608,11926,12215,12615,13821,-759,-2893,-2742,-3120,-2696,-3209,-2980,-3653,-3935,-4648,-5893,392,2148,2030,2242,2345,2496,2882,2818,1933,1306,1146,139,2923,4065,7651,8314,11404,12919,9159,6459,5391,6206,531,5071,6095,9893,10659,13900,15801,11977,8392,6697,7352,-143,-32,-64,119,144,111,42,35,0,-25,-24,19948,19937,19927,19984,19980,19818,19742,19847,19865,19928,19927,19928,9.2610253286,9.0054698966,9.0823714024,9.2912961235,9.1959463547,9.0431198973,8.5756652412,8.5262860353,8.176691247,8.1222476128,12.414155407,11.985196994,12.454217996,12.181492772,12.601577267,12.16649696,12.362309158,12.578331391,12.947026494,14.159634745,-3.153130078,-2.979727097,-3.371846594,-2.890196648,-3.405630912,-3.123377062,-3.786643917,-4.052045356,-4.770335247,-6.037387132,2.3411418625,2.2059978146,2.4229743794,2.5139136275,2.6489419621,3.0206619778,2.9210956908,1.9904964863,1.3403738884,1.1740786786,3.1858275904,4.4174291215,8.2685891956,8.9128690401,12.102778099,13.540573245,9.4940792873,6.6511209543,5.5328909894,6.3580560904,5.5269694529,6.6234269361,10.691563575,11.426782668,14.751720061,16.561235222,12.415174978,8.6416174406,6.8732648778,7.5321347691 +050,3,5,12,105,Florida,Polk County,602095,602068,603119,610026,615581,622808,634624,648823,666271,685790,707095,724967,744552,1051,6907,5555,7227,11816,14199,17448,19519,21305,17872,19585,1753,7174,7249,7241,7486,7523,7701,7812,7880,8010,8169,1298,5960,5818,6154,6130,6590,6769,6827,7090,7516,8009,455,1214,1431,1087,1356,933,932,985,790,494,160,455,2651,2419,2143,2533,2756,3109,3259,3795,517,1207,188,3050,1795,4021,7774,10413,13357,15205,16659,16902,18329,643,5701,4214,6164,10307,13169,16466,18464,20454,17419,19536,-47,-8,-90,-24,153,97,50,70,61,-41,-111,12261,12547,12874,12171,12607,13064,12835,13417,13489,13714,13792,13783,11.827110527,11.829240531,11.69422532,11.906806889,11.723117511,11.711710342,11.555691644,11.314645502,11.186666499,11.11792362,9.8257009673,9.4940711011,9.9387187709,9.7500302203,10.269220311,10.294321166,10.098656791,10.180309214,10.496752236,10.900165292,2.0014095595,2.3351694303,1.7555065492,2.1567766686,1.4538972003,1.4173891752,1.4570348527,1.1343362876,0.6899142635,0.2177583277,4.3704586014,3.9474317624,3.4609480543,4.0288460927,4.2946845487,4.7281791264,4.8207884112,5.4491217868,0.7220357778,1.6427143848,5.0282530118,2.9291608158,6.4939207309,12.36488335,16.226614734,20.313376838,22.491588767,23.920136982,23.605123242,24.94557743,9.3987116132,6.8765925782,9.9548687852,16.393729442,20.521299282,25.041555965,27.312377178,29.369258769,24.32715902,26.588291815 +050,3,5,12,107,Florida,Putnam County,74364,74380,74223,73657,72936,72380,71987,71961,72410,73418,73968,74309,74815,-157,-566,-721,-556,-393,-26,449,1008,550,341,506,214,902,824,794,822,834,841,856,815,828,814,256,972,874,948,949,976,964,1019,1035,1084,1064,-42,-70,-50,-154,-127,-142,-123,-163,-220,-256,-250,7,7,14,14,16,24,26,24,28,-16,-5,-115,-502,-687,-408,-264,101,548,1147,740,614,765,-108,-495,-673,-394,-248,125,574,1171,768,598,760,-7,-1,2,-8,-18,-9,-2,0,2,-1,-4,1407,1407,1426,1428,1422,1427,1432,1394,1403,1422,1422,1422,12.199080335,11.242010191,10.927908833,11.387643991,11.587517715,11.650539236,11.739857915,11.059395058,11.168286383,10.917089134,13.145793887,11.924171004,13.047427675,13.147048841,13.560452386,13.354482548,13.975368242,14.044753233,14.621283139,14.270003487,-0.946713552,-0.682160813,-2.119518842,-1.75940485,-1.972934671,-1.703943313,-2.235510327,-2.985358175,-3.452996756,-3.352914353,0.0946713552,0.1910050275,0.1926835311,0.221657304,0.3334537472,0.3601831393,0.3291548948,0.3799546768,-0.215812297,-0.067058287,-6.789288612,-9.372889565,-5.61534862,-3.657345515,1.4032845194,7.5915523201,15.730861014,10.041659316,8.2817969071,10.259917921,-6.694617257,-9.181884537,-5.422665088,-3.435688211,1.7367382666,7.9517354593,16.060015909,10.421613993,8.0659846099,10.192859634 +050,3,5,12,109,Florida,St. Johns County,190039,190040,191268,196165,202164,209579,218009,226582,235192,244067,254007,265068,278715,1228,4897,5999,7415,8430,8573,8610,8875,9940,11061,13647,430,1850,1812,1970,2041,2164,2194,2072,2210,2222,2282,310,1515,1478,1686,1697,1828,1943,1996,2065,2109,2330,120,335,334,284,344,336,251,76,145,113,-48,28,105,180,252,200,273,375,344,274,63,100,1015,4433,5319,6729,7667,7863,7955,8426,9512,10926,13690,1043,4538,5499,6981,7867,8136,8330,8770,9786,10989,13790,65,24,166,150,219,101,29,29,9,-41,-95,2798,2809,2820,2858,2831,2885,2817,2842,3043,2967,2968,2967,9.5500383292,9.0980069239,9.5690758556,9.5465728692,9.734789953,9.5024838991,8.6466816481,8.8741833543,8.5613832298,8.3930538468,7.8207070642,7.4210012326,8.1895745647,7.9375473587,8.2232883707,8.4153720218,8.3295253715,8.291940555,8.1259933536,8.5695948568,1.729331265,1.6770056913,1.3795012909,1.6090255105,1.5115015824,1.0871118772,0.3171562767,0.5822427993,0.4353898762,-0.17654101,0.5420292025,0.9037755222,1.2240645257,0.935479948,1.2280950357,1.6241711313,1.4355494628,1.1002381172,0.2427394885,0.3677937707,22.88395671,26.706566682,32.685437275,35.861623806,35.371836137,34.454083599,35.162615621,38.195127632,42.097962722,50.350967206,23.425985912,27.610342205,33.909501801,36.797103754,36.599931173,36.078254731,36.598165084,39.295365749,42.340702211,50.718760976 +050,3,5,12,111,Florida,St. Lucie County,277789,277257,278290,280481,283042,285437,290207,297471,305775,313207,320340,328063,337186,1033,2191,2561,2395,4770,7264,8304,7432,7133,7723,9123,719,3079,3049,2910,2991,2976,3100,3012,3103,3079,3152,619,2704,2824,2827,2935,3129,3085,3226,3348,3544,3913,100,375,225,83,56,-153,15,-214,-245,-465,-761,182,654,630,660,819,972,1086,1040,786,508,438,726,1174,1728,1665,3813,6366,7172,6586,6580,7707,9494,908,1828,2358,2325,4632,7338,8258,7626,7366,8215,9932,25,-12,-22,-13,82,79,31,20,12,-27,-48,3053,3053,3053,3051,3050,3049,3048,3042,3042,3038,3040,3041,11.020614885,10.821208717,10.237845197,10.391839401,10.127995263,10.27773081,9.7321085266,9.7956426279,9.4971799945,9.4761510352,9.6783834523,10.022661009,9.9458379289,10.197274705,10.648688568,10.227999854,10.423566437,10.56906591,10.931473173,11.76401618,1.3422314329,0.7985477079,0.2920072685,0.1945646962,-0.520693305,0.0497309555,-0.69145791,-0.773423282,-1.434293179,-2.287865145,2.340851619,2.2359335821,2.3219855087,2.8455086824,3.3079339366,3.6005211804,3.3603561978,2.4812681616,1.5669267415,1.3168001756,4.202079206,6.1328463967,5.8577361697,13.247771192,21.66492535,23.778027538,21.280101845,20.771939572,23.77225275,28.542696043,6.542930825,8.3687799788,8.1797216784,16.093279874,24.972859287,27.378548718,24.640458042,23.253207734,25.339179492,29.859496219 +050,3,5,12,113,Florida,Santa Rosa County,151372,151371,152924,155796,158285,160519,162840,166451,170224,174413,179573,184587,189139,1553,2872,2489,2234,2321,3611,3773,4189,5160,5014,4552,451,1793,1845,1855,1837,1823,1957,1895,1980,1938,1967,277,1235,1288,1243,1255,1342,1379,1501,1654,1663,1855,174,558,557,612,582,481,578,394,326,275,112,65,56,332,151,103,212,155,68,-39,-12,-6,1184,2243,1576,1463,1629,2887,3032,3716,4856,4760,4474,1249,2299,1908,1614,1732,3099,3187,3784,4817,4748,4468,130,15,24,8,7,31,8,11,17,-9,-28,4244,5168,6112,6161,6141,6157,6677,6562,6075,6033,6169,6169,11.61570355,11.748561677,11.6372442,11.361984667,11.07227346,11.625454815,10.997078085,11.186883097,10.643673111,10.526428453,8.0007774035,8.2017059294,7.7978946312,7.7622704177,8.150845301,8.1918764387,8.7106143566,9.3450023447,9.1333479789,9.9270588613,3.6149261467,3.5468557474,3.839349569,3.5997142495,2.9214281593,3.4335783768,2.2864637285,1.8418807523,1.5103251318,0.5993695916,0.3627882871,2.1141043234,0.9472904982,0.6370628311,1.287614906,0.9207692879,0.3946181054,-0.220347697,-0.065905097,-0.032109085,14.530966572,10.035627752,9.178052973,10.075488853,17.534642611,18.011435361,21.56471882,27.436113293,26.142355009,23.94267458,14.893754859,12.149732075,10.125343471,10.712551684,18.822257517,18.932204648,21.959336926,27.215765595,26.076449912,23.910565495 +050,3,5,12,115,Florida,Sarasota County,379448,379427,379942,382298,386585,390153,396636,405099,413395,420073,426890,435006,443465,515,2356,4287,3568,6483,8463,8296,6678,6817,8116,8459,690,2833,2970,2806,2882,2967,2967,2790,2873,2891,2895,1186,4951,5014,5160,5132,5448,5534,5721,5772,6112,6732,-496,-2118,-2044,-2354,-2250,-2481,-2567,-2931,-2899,-3221,-3837,148,718,579,663,874,1086,1339,1321,853,709,561,868,3766,5631,5220,7666,9748,9501,8280,8873,10687,11804,1016,4484,6210,5883,8540,10834,10840,9601,9726,11396,12365,-5,-10,121,39,193,110,23,8,-10,-59,-69,5622,5659,5705,5714,5648,5662,5790,5842,5940,6005,6001,6003,7.4333543241,7.7254926952,7.2250874812,7.3259793922,7.4014481094,7.2499004269,6.6949181012,6.7842396893,6.7084659866,6.5909973124,12.99065911,13.042296422,13.286333358,13.045428952,13.590525548,13.52239601,13.728181526,13.629875213,14.182685614,15.32663002,-5.557304786,-5.316803727,-6.061245877,-5.71944956,-6.189077438,-6.272495583,-7.033263425,-6.845635524,-7.474219627,-8.735632707,1.8839210747,1.5060808992,1.7071393443,2.2216884069,2.7091245861,3.2718627137,3.1698877461,2.0142556404,1.645210095,1.2772191683,9.881402183,14.647222009,13.440825607,19.486800146,24.317261938,23.215808546,19.868789204,20.952509141,24.798815634,26.873966244,11.765323258,16.153302908,15.147964951,21.708488553,27.026386524,26.48767126,23.03867695,22.966764782,26.444025729,28.151185412 +050,3,5,12,117,Florida,Seminole County,422718,422720,423072,426382,430626,435640,441583,448535,456266,463052,468195,471791,474171,352,3310,4244,5014,5943,6952,7731,6786,5143,3596,2380,1077,4464,4388,4468,4446,4578,4695,4654,4736,4692,4654,772,2840,2879,3049,3123,3315,3334,3550,3635,3613,3972,305,1624,1509,1419,1323,1263,1361,1104,1101,1079,682,259,1039,1054,1370,1704,1999,2406,2482,2406,859,1053,-200,657,1764,2258,2951,3701,3974,3221,1653,1651,624,59,1696,2818,3628,4655,5700,6380,5703,4059,2510,1677,-12,-10,-83,-33,-35,-11,-10,-21,-17,7,21,3515,3515,3514,3515,3516,3516,3517,3514,3511,3511,3512,3513,10.510280721,10.240277804,10.315538183,10.136533128,10.286276651,10.377972615,10.124896934,10.171307934,9.9831274083,9.8397187202,6.6866481293,6.7187237459,7.0394082187,7.1201963469,7.4484506549,7.3695762936,7.7231164842,7.8067365586,7.687348535,8.3978003345,3.8236325922,3.5215540578,3.2761299647,3.016336781,2.8378259961,3.0083963214,2.4017804503,2.3645713758,2.2957788733,1.4419183857,2.4462772557,2.4597203293,3.1630007411,3.8849870557,4.491539324,5.3182965094,5.3996549616,5.1672649684,1.8276867953,2.2263050736,1.5468759933,4.1166476859,5.2131793237,6.7280497661,8.3157513948,8.7842520068,7.0073685058,3.5500785506,3.512818276,1.3192918954,3.993153249,6.5763680152,8.3761800648,10.613036822,12.807290719,14.102548516,12.407023467,8.717343519,5.3405050714,3.545596969 +050,3,5,12,119,Florida,Sumter County,93420,93420,94286,98011,101727,106980,112354,117229,122249,125298,129351,133772,139018,866,3725,3716,5253,5374,4875,5020,3049,4053,4421,5246,103,440,438,454,465,522,485,473,437,482,469,280,1209,1304,1373,1434,1601,1788,1888,1979,2073,2269,-177,-769,-866,-919,-969,-1079,-1303,-1415,-1542,-1591,-1800,-3,24,3,10,-2,31,71,66,66,-24,2,982,4444,4435,6065,6146,5838,6222,4388,5527,6073,7085,979,4468,4438,6075,6144,5869,6293,4454,5593,6049,7087,64,26,144,97,199,85,30,10,2,-37,-41,8952,8908,8863,8601,8644,8309,8446,8216,8011,8210,8273,8264,4.5762544397,4.3857453264,4.3505967696,4.2401086927,4.5473750234,4.050476453,3.8214965239,3.4321752687,3.6636858047,3.4385424686,12.574299131,13.057104807,13.157201244,13.075948097,13.947025694,14.93247814,15.253669,15.542963059,15.756889364,16.635507167,-7.998044691,-8.671359481,-8.806604474,-8.835839405,-9.399650671,-10.88200169,-11.43217248,-12.11078779,-12.09320356,-13.1969647,0.2496138785,0.0300393516,0.0958281227,-0.018237027,0.2700548386,0.5929563467,0.5332320731,0.5183605669,-0.182424189,0.0146632941,46.220169841,44.408174709,58.119756405,56.04238285,50.857424112,51.963019568,35.451853587,43.408770504,46.160920938,51.944719381,46.46978372,44.43821406,58.215584528,56.024145823,51.127478951,52.555975914,35.985085661,43.927131071,45.978496749,51.959382675 +050,3,5,12,121,Florida,Suwannee County,41551,41552,42329,43365,43533,43578,43777,43670,43849,44125,44206,44420,44851,777,1036,168,45,199,-107,179,276,81,214,431,121,482,476,471,462,440,479,433,454,456,458,69,526,533,553,547,567,551,600,574,576,617,52,-44,-57,-82,-85,-127,-72,-167,-120,-120,-159,16,40,28,10,2,9,13,14,11,0,0,620,1032,194,120,283,18,239,431,194,335,592,636,1072,222,130,285,27,252,445,205,335,592,89,8,3,-3,-1,-7,-1,-2,-4,-1,-2,1393,2148,2911,3259,3325,3462,3429,3227,3116,2577,2511,2513,11.249329008,10.955372966,10.813789303,10.577528476,10.063238304,10.946194541,9.8438174915,10.279516817,10.290433958,10.260890995,12.27623871,12.267255863,12.696444766,12.523610555,12.967854815,12.591551549,13.640393753,12.996569721,12.998442895,13.823078043,-1.026909702,-1.311882897,-1.882655463,-1.946082079,-2.904616511,-1.645357008,-3.796576261,-2.717052903,-2.708008936,-3.562187048,0.9335542745,0.6444337039,0.2295921296,0.0457901666,0.2058389653,0.2970783487,0.3182758542,0.2490631828,0,0,24.085700282,4.4650049483,2.755105555,6.4793085685,0.4116779306,5.46167118,9.7983495124,4.3925688603,7.5598582809,13.26298574,25.019254557,5.1094386522,2.9846976846,6.525098735,0.6175168959,5.7587495287,10.116625367,4.6416320431,7.5598582809,13.26298574 +050,3,5,12,123,Florida,Taylor County,22570,22572,22594,22666,22760,22880,22591,22362,22098,21784,21525,21537,21600,22,72,94,120,-289,-229,-264,-314,-259,12,63,59,255,251,224,239,222,243,233,229,233,234,35,219,230,240,222,286,253,260,274,249,262,24,36,21,-16,17,-64,-10,-27,-45,-16,-28,4,17,17,16,20,9,10,12,11,2,4,-3,18,53,121,-335,-174,-266,-301,-226,25,87,1,35,70,137,-315,-165,-256,-289,-215,27,91,-3,1,3,-1,9,0,2,2,1,1,0,3254,3247,3218,3550,3572,3368,3237,2986,2636,2419,2427,2428,11.268228016,11.05093999,9.8159509202,10.512194586,9.8769826263,10.931174089,10.61938836,10.575169133,10.821606056,10.849155018,9.6774193548,10.126359354,10.517090272,9.7644652636,12.724401041,11.381016644,11.84996126,12.653259138,11.564720635,12.147344507,1.5908086611,0.9245806366,-0.701139351,0.747729322,-2.847418415,-0.449842555,-1.2305729,-2.078090004,-0.743114579,-1.298189489,0.7512152011,0.7484700392,0.7011393514,0.8796815553,0.4004182146,0.4498425551,0.5469212889,0.5079775566,0.0928893224,0.1854556413,0.7954043305,2.3334654163,5.3023663453,-14.73466605,-7.741418815,-11.96581197,-13.718609,-10.4366298,1.1611165297,4.0336601989,1.5466195316,3.0819354555,6.0035056968,-13.8549845,-7.341000601,-11.51596941,-13.17168771,-9.928652243,1.254005852,4.2191158402 +050,3,5,12,125,Florida,Union County,15535,15537,15551,15308,15266,15165,15260,15268,15256,15455,15302,15213,15182,14,-243,-42,-101,95,8,-12,199,-153,-89,-31,43,172,165,182,184,144,161,132,155,160,163,23,197,159,217,217,249,242,233,253,244,257,20,-25,6,-35,-33,-105,-81,-101,-98,-84,-94,3,14,12,17,9,6,7,5,5,0,2,-10,-233,-59,-81,119,106,63,294,-60,-6,60,-7,-219,-47,-64,128,112,70,299,-55,-6,62,1,1,-1,-2,0,1,-1,1,0,1,1,4778,4766,4713,4723,4742,4780,4842,4931,5163,5048,4815,4814,11.147477235,10.79348466,11.961486642,12.095316352,9.4339622642,10.549076137,8.596268438,10.079006405,10.486645912,10.725448265,12.767750089,10.400994309,14.261772535,14.264585045,16.312893082,15.856375311,15.173716258,16.451539487,15.992135016,16.910676098,-1.620272854,0.3924903513,-2.300285893,-2.169268694,-6.878930818,-5.307299174,-6.57744782,-6.372533082,-5.505489104,-6.185227834,0.9073527982,0.7849807026,1.1172817193,0.5916187346,0.393081761,0.4586554842,0.3256162287,0.3251292389,0,0.1316005922,-15.100943,-3.859488454,-5.32351878,7.8225143796,6.9444444444,4.1278993579,19.146234248,-3.901550866,-0.393249222,3.9480177661,-14.1935902,-3.074507752,-4.206237061,8.4141331142,7.3375262055,4.5865548421,19.471850477,-3.576421628,-0.393249222,4.0796183583 +050,3,5,12,127,Florida,Volusia County,494593,494592,494462,494558,496711,500702,507050,517144,529100,538755,547117,554065,561497,-130,96,2153,3991,6348,10094,11956,9655,8362,6948,7432,1167,4591,4685,4681,4757,4842,4997,4957,4938,4878,4836,1552,6136,6191,6393,6575,6839,6833,7227,7528,7529,7812,-385,-1545,-1506,-1712,-1818,-1997,-1836,-2270,-2590,-2651,-2976,168,915,893,1088,1237,1303,1613,1702,1747,447,672,153,754,2784,4564,6786,10661,12122,10181,9182,9174,9776,321,1669,3677,5652,8023,11964,13735,11883,10929,9621,10448,-66,-28,-18,51,143,127,57,42,23,-22,-40,12809,12811,12836,12759,13394,13400,13683,14322,14297,14469,14484,14480,9.2839376352,9.4525300398,9.3862823123,9.4408148036,9.4552399252,9.5522650548,9.2840320081,9.0949946218,8.8595708975,8.6700694359,12.408242503,12.49105944,12.819163175,13.048845351,13.354891749,13.061962601,13.535545556,13.865354296,13.674397148,14.005496781,-3.124304867,-3.0385294,-3.432880863,-3.608030547,-3.899651824,-3.509697547,-4.251513548,-4.770359674,-4.81482625,-5.335427345,1.8503164749,1.8017309126,2.1816439128,2.4549690797,2.5444398229,3.0834107531,3.1876987044,3.2176904829,0.8118548977,1.2047739166,1.5247416635,5.6170423972,9.1516753842,13.467599171,20.818321529,23.172414848,19.068131909,16.911753872,16.662095821,17.526591978,3.3750581384,7.4187733098,11.333319297,15.922568251,23.362761352,26.255825601,22.255830614,20.129444354,17.473950718,18.731365894 +050,3,5,12,129,Florida,Wakulla County,30776,30781,30824,30977,30860,31009,31418,31529,31894,32055,32369,33636,34319,43,153,-117,149,409,111,365,161,314,1267,683,69,338,308,303,328,349,347,330,312,328,325,76,224,255,259,245,259,267,316,276,274,306,-7,114,53,44,83,90,80,14,36,54,19,1,11,9,7,17,9,13,10,17,-3,2,47,27,-184,97,304,12,275,138,263,1216,664,48,38,-175,104,321,21,288,148,280,1213,666,2,1,5,1,5,0,-3,-1,-2,0,-2,3428,3427,3404,3265,3592,3674,3434,3296,2963,2596,3251,3248,10.938334331,9.9616734318,9.7948892014,10.508273664,11.088693663,10.942402598,10.320724327,9.6858313672,9.938641012,9.5651534103,7.2490736396,8.2474893672,8.3725290533,7.849167828,8.2291451539,8.4196584835,9.8828754163,8.5682354402,8.3024013332,9.0059598264,3.6892606916,1.7141840646,1.4223601481,2.6591058356,2.8595485091,2.5227441149,0.4378489109,1.117595927,1.6362396788,0.559193584,0.3559812948,0.29108786,0.226284569,0.544636135,0.2859548509,0.4099459187,0.312749222,0.5277536322,-0.090902204,0.0588624825,0.8737722691,-5.951129583,3.1356575991,9.7393755907,0.3812731345,8.671932895,4.3159392641,8.1646591332,36.845693508,19.542344198,1.2297535639,-5.660041723,3.3619421681,10.284011726,0.6672279854,9.0818788137,4.6286884861,8.6924127654,36.754791304,19.601206681 +050,3,5,12,131,Florida,Walton County,55043,55044,55214,55613,57215,59232,61244,63145,65488,68110,70874,74127,76648,170,399,1602,2017,2012,1901,2343,2622,2764,3253,2521,136,625,661,696,764,770,763,794,784,808,850,151,565,511,543,574,596,596,661,691,725,740,-15,60,150,153,190,174,167,133,93,83,110,12,47,39,46,18,49,42,33,5,6,8,159,292,1364,1769,1741,1652,2119,2439,2653,3169,2418,171,339,1403,1815,1759,1701,2161,2472,2658,3175,2426,14,0,49,49,63,26,15,17,13,-5,-15,2065,2065,2065,2057,2023,2043,1963,1985,2020,2073,2031,2031,11.278839994,11.716949693,11.953936125,12.683024005,12.380515962,11.863207731,11.886405485,11.281874173,11.144750726,11.27507876,10.196071354,9.0580352395,9.3261312013,9.5288688203,9.5828409264,9.2666734042,9.8953577149,9.9435906291,9.999931035,9.8159509202,1.0827686394,2.6589144539,2.6278049241,3.1541551844,2.7976750356,2.5965343263,1.9910477702,1.3382835434,1.1448196909,1.4591278395,0.8481687675,0.691317758,0.7900589968,0.2988147017,0.7878510158,0.653020609,0.4940193715,0.0719507281,0.0827580499,0.1061183883,5.2694740451,24.178395434,30.382920986,28.902021979,26.561834246,32.946444536,36.512522643,38.177056352,43.710043379,32.074282872,6.1176428127,24.869713192,31.172979982,29.200836681,27.349685262,33.599465145,37.006542014,38.24900708,43.792801429,32.18040126 +050,3,5,12,133,Florida,Washington County,24896,24901,24726,24516,24747,24506,24300,24556,24469,24577,24845,25647,25932,-175,-210,231,-241,-206,256,-87,108,268,802,285,61,221,240,247,223,240,236,239,248,284,276,102,276,271,247,280,260,330,337,328,348,357,-41,-55,-31,0,-57,-20,-94,-98,-80,-64,-81,3,1,7,4,8,9,23,26,16,17,11,-151,-157,243,-248,-154,265,-15,181,332,849,356,-148,-156,250,-244,-146,274,8,207,348,866,367,14,1,12,3,-3,2,-1,-1,0,0,-1,2694,2555,2400,2719,2671,2754,2741,2561,2533,2464,2620,2620,8.9760773324,9.7436209731,10.029845898,9.1382207106,9.8247912232,9.6277409485,9.745952779,10.036016349,11.249306821,10.702029896,11.209942732,11.002172016,10.029845898,11.473999098,10.643523825,13.462519123,13.742201199,13.273440978,13.784361879,13.842843018,-2.233865399,-1.258551042,0,-2.335778388,-0.818732602,-3.834778174,-3.99624842,-3.237424629,-2.535055058,-3.140813122,0.0406157345,0.2841889451,0.1624266542,0.3278285457,0.3684296709,0.9382967874,1.0602291726,0.6474849257,0.6733739998,0.426530177,-6.376670322,9.8654162353,-10.07045256,-6.310699504,10.848206976,-0.611932687,7.3808261632,13.435312209,33.629089757,13.804067547,-6.336054588,10.14960518,-9.908025907,-5.982870958,11.216636646,0.3263640999,8.4410553358,14.082797135,34.302463757,14.230597724 +040,3,5,13,000,Georgia,Georgia,9687653,9688737,9712209,9803630,9903580,9975592,10071204,10183353,10308442,10417031,10519389,10628020,10710017,23472,91421,99950,72012,95612,112149,125089,108589,102358,108631,81997,32490,132638,131860,128689,129543,131678,131395,129077,128171,125873,125818,17216,71163,70456,74852,74843,78566,80067,82135,84768,85998,94638,15274,61475,61404,53837,54700,53112,51328,46942,43403,39875,31180,4369,12560,22454,23207,17777,26234,35276,21846,17766,16252,13275,3034,17118,14974,-5842,22919,32650,38504,39798,41256,52508,37563,7403,29678,37428,17365,40696,58884,73780,61644,59022,68760,50838,795,268,1118,810,216,153,-19,3,-67,-4,-21,254026,257407,260196,265392,260973,262010,259241,256193,259020,262019,268201,268022,13.592856551,13.381904389,12.947118723,12.924060284,13.002308567,12.824157181,12.455879777,12.243831562,11.904342513,11.792837364,7.2928455702,7.1502764724,7.5306959465,7.4668291132,7.7578591326,7.8145423571,7.9259952234,8.0976594852,8.133194946,8.8703567249,6.3000109808,6.2316279169,5.4164227766,5.4572311705,5.2444494343,5.0096148239,4.5298845532,4.1461720772,3.7711475671,2.9224806387,1.2871596245,2.2787599056,2.3348054939,1.7735502471,2.5904294031,3.4429389909,2.1081304152,1.6971382882,1.5370204454,1.2442569108,1.7542673928,1.5196468704,-0.587750838,2.2865499305,3.2239658463,3.7579919182,3.8404913606,3.9410749307,4.9659038608,3.5207549785,3.0414270173,3.798406776,1.747054656,4.0601001776,5.8143952494,7.2009309092,5.9486217757,5.6382132189,6.5029243062,4.7650118893 +050,3,5,13,001,Georgia,Appling County,18236,18237,18337,18459,18382,18367,18469,18420,18443,18447,18538,18389,18325,100,122,-77,-15,102,-49,23,4,91,-149,-64,63,260,275,262,254,258,263,223,230,225,213,28,194,174,188,203,218,225,187,214,219,224,35,66,101,74,51,40,38,36,16,6,-11,-3,-16,-7,-7,-8,7,14,8,7,6,3,60,73,-177,-82,62,-93,-29,-38,69,-160,-57,57,57,-184,-89,54,-86,-15,-30,76,-154,-54,8,-1,6,0,-3,-3,0,-2,-1,-1,1,426,488,586,448,366,393,411,405,399,416,418,416,14.131970866,14.929019299,14.258891398,13.790856771,13.987909675,14.269050267,12.089997289,12.437474652,12.186205216,11.603203138,10.544624416,9.4459976656,10.231570927,11.021826474,11.819241508,12.207362396,10.138248848,11.572259024,11.861239743,12.202429591,3.5873464507,5.4830216335,4.0273204713,2.7690302964,2.1686681667,2.0616878713,1.9517484413,0.865215628,0.3249654724,-0.599226453,-0.869659746,-0.3800114,-0.380962747,-0.434357694,0.3795169292,0.7595692157,0.4337218758,0.3785318372,0.3249654724,0.1634253963,3.9678225894,-9.608859694,-4.462706468,3.3662721251,-5.042153487,-1.573393375,-2.06017891,3.7312423956,-8.665745931,-3.10508253,3.0981628438,-9.988871095,-4.843669215,2.9319144315,-4.662636558,-0.81382416,-1.626457034,4.1097742328,-8.340780459,-2.941657134 +050,3,5,13,003,Georgia,Atkinson County,8375,8380,8363,8359,8254,8263,8211,8331,8293,8257,8344,8269,8393,-17,-4,-105,9,-52,120,-38,-36,87,-75,124,25,138,124,123,138,118,140,115,111,126,134,7,65,81,79,75,64,85,92,79,62,81,18,73,43,44,63,54,55,23,32,64,53,0,-1,0,4,1,4,58,38,33,30,26,-37,-77,-151,-38,-117,60,-151,-96,21,-168,44,-37,-78,-151,-34,-116,64,-93,-58,54,-138,70,2,1,3,-1,1,2,0,-1,1,-1,1,20,21,21,22,22,25,20,21,21,20,21,21,16.505202727,14.92806838,14.893745838,16.753672454,14.266715028,16.843118383,13.897280967,13.372688392,15.168843677,16.084503661,7.7741896902,9.7513995064,9.5659017981,9.1052567682,7.7378793374,10.226179018,11.117824773,9.5174989458,7.4640341901,9.7227223623,8.7310130367,5.1766688738,5.3278440395,7.6484156853,6.528835691,6.6169393648,2.7794561934,3.8551894464,7.7048094865,6.3617812988,-0.119602918,0,0.4843494581,0.1214034236,0.4836174586,6.9778633301,4.5921450151,3.9756641166,3.6116294468,3.1208738447,-9.20942471,-18.17853488,-4.601319852,-14.20420056,7.2542618789,-18.16650626,-11.60120846,2.5299680742,-20.2251249,5.2814788141,-9.329027628,-18.17853488,-4.116970394,-14.08279713,7.7378793374,-11.18864293,-7.009063444,6.5056321908,-16.61349546,8.4023526587 +050,3,5,13,005,Georgia,Bacon County,11096,11097,11062,11150,11152,11174,11178,11225,11268,11204,11096,11098,11036,-35,88,2,22,4,47,43,-64,-108,2,-62,37,137,169,140,131,165,150,168,162,141,136,58,136,113,117,133,127,133,133,153,113,113,-21,1,56,23,-2,38,17,35,9,28,23,0,-2,2,8,3,-6,-4,-4,-4,-5,-4,-13,89,-58,-7,5,18,31,-98,-111,-21,-80,-13,87,-56,1,8,12,27,-102,-115,-26,-84,-1,0,2,-2,-2,-3,-1,3,-2,0,-1,325,339,363,339,325,306,325,325,325,323,297,297,12.33567441,15.155591427,12.541431515,11.72154617,14.730170067,13.337482772,14.951940192,14.529147982,12.706136794,12.288786482,12.245632991,10.133620303,10.48105348,11.900501074,11.337767263,11.825901392,11.836952652,13.721973094,10.182932324,10.210535827,0.0900414191,5.0219711237,2.0603780346,-0.178954903,3.3924028032,1.5115813809,3.11498754,0.8071748879,2.5232044697,2.0782506551,-0.180082838,0.1793561116,0.7166532294,0.268432355,-0.535642548,-0.355666207,-0.355998576,-0.358744395,-0.450572227,-0.361434897,8.0136862957,-5.201327235,-0.627071576,0.4473872584,1.6069276436,2.7564131063,-8.721965112,-9.955156951,-1.892403352,-7.228697931,7.8336034576,-5.021971124,0.0895816537,0.7158196135,1.0712850957,2.400746899,-9.077963688,-10.31390135,-2.342975579,-7.590132827 +050,3,5,13,007,Georgia,Baker County,3451,3447,3431,3311,3370,3346,3287,3192,3185,3158,3089,3047,2971,-16,-120,59,-24,-59,-95,-7,-27,-69,-42,-76,4,35,35,32,25,37,31,27,39,29,24,2,27,16,25,23,44,31,44,26,21,25,2,8,19,7,2,-7,0,-17,13,8,-1,0,2,2,3,-1,0,0,0,0,0,0,-19,-131,38,-33,-61,-90,-6,-11,-81,-50,-74,-19,-129,40,-30,-62,-90,-6,-11,-81,-50,-74,1,1,0,-1,1,2,-1,1,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,10.382675764,10.477473432,9.5294818344,7.5380672396,11.421515666,9.7224400188,8.513321772,12.485993277,9.4524119948,7.9760717846,8.0094927321,4.7897021404,7.4449076831,6.9350218604,13.582342954,9.7224400188,13.873561406,8.3239955178,6.8448500652,8.308408109,2.3731830317,5.6877712917,2.0845741513,0.6030453792,-2.160827288,0,-5.360239634,4.1619977589,2.6075619296,-0.332336324,0.5932957579,0.5987127675,0.893388922,-0.30152269,0,0,0,0,0,0,-38.86087214,11.375542583,-9.827278142,-18.39288406,-27.78206513,-1.881762584,-3.468390352,-25.93244757,-16.29726206,-24.592888,-38.26757639,11.974255351,-8.93388922,-18.69440675,-27.78206513,-1.881762584,-3.468390352,-25.93244757,-16.29726206,-24.592888 +050,3,5,13,009,Georgia,Baldwin County,45720,45840,45703,45178,46522,46191,45920,45566,45260,44993,45001,45006,45099,-137,-525,1344,-331,-271,-354,-306,-267,8,5,93,119,500,466,485,455,488,418,404,434,401,390,129,370,399,372,402,414,435,492,494,482,510,-10,130,67,113,53,74,-17,-88,-60,-81,-120,7,22,32,28,19,36,55,44,44,32,30,-140,-681,1188,-478,-340,-469,-345,-222,27,52,180,-133,-659,1220,-450,-321,-433,-290,-178,71,84,210,6,4,57,6,-3,5,1,-1,-3,2,3,4655,4569,4577,5908,5765,5891,5722,5711,5569,5683,5826,5819,11.003400051,10.163576881,10.462394702,9.8793846555,10.668298975,9.2044128333,8.9526109935,9.6450874503,8.9104180786,8.6565673381,8.1425160375,8.7022900763,8.0247645961,8.7285991901,9.0505651138,9.5787549821,10.902684675,10.978509678,10.710278089,11.320126519,2.8608840132,1.4612868048,2.4376301058,1.1507854654,1.6177338609,-0.374342149,-1.950073682,-1.333422228,-1.799860011,-2.663559181,0.4841496022,0.6979280262,0.6040145395,0.4125457329,0.7870056621,1.2111069518,0.9750368409,0.9778429673,0.7110558068,0.6658897952,-14.98663087,25.910577972,-10.31139107,-7.382397325,-10.25293488,-7.596943606,-4.919504061,0.6000400027,1.155465686,3.9953387714,-14.50248127,26.608505998,-9.707376528,-6.969851592,-9.465929213,-6.385836655,-3.94446722,1.57788297,1.8665214928,4.6612285667 +050,3,5,13,011,Georgia,Banks County,18395,18373,18404,18245,18128,18216,18220,18375,18292,18607,18918,19175,19352,31,-159,-117,88,4,155,-83,315,311,257,177,50,183,184,159,211,236,173,208,201,209,200,21,135,171,133,141,187,175,158,193,173,173,29,48,13,26,70,49,-2,50,8,36,27,1,-3,2,2,4,23,21,5,4,5,4,2,-206,-131,62,-70,86,-101,259,300,216,148,3,-209,-129,64,-66,109,-80,264,304,221,152,-1,2,-1,-2,0,-3,-1,1,-1,0,-2,0,0,0,0,0,0,0,0,0,0,0,0,9.9866299217,10.117394771,8.7497248514,11.581951916,12.897936877,9.436277852,11.274018266,10.712858095,10.973144672,10.382329276,7.3671860078,9.4025788359,7.3189522342,7.7395981996,10.219975406,9.5453677694,8.5639177213,10.286475683,9.0830336282,8.9807148234,2.6194439139,0.7148159349,1.4307726172,3.8423537161,2.6779614701,-0.109089917,2.7101005447,0.4263824117,1.890111044,1.4016144522,-0.163715245,0.1099716823,0.1100594321,0.2195630695,1.2570023227,1.1454441323,0.2710100545,0.2131912059,0.2625154228,0.2076465855,-11.24178013,-7.20314519,3.4118423949,-3.842353716,4.7000956415,-5.509040827,14.038320822,15.98934044,11.340666264,7.6829236639,-11.40549538,-7.093173508,3.521901827,-3.622790647,5.9570979642,-4.363596695,14.309330876,16.202531646,11.603181687,7.8905702494 +050,3,5,13,013,Georgia,Barrow County,69367,69349,69670,69835,70128,71233,72843,74979,77108,79086,81105,83581,85588,321,165,293,1105,1610,2136,2129,1978,2019,2476,2007,263,1073,1077,1062,987,1038,1067,1026,1015,1052,1094,140,514,493,509,565,539,600,588,696,641,725,123,559,584,553,422,499,467,438,319,411,369,15,49,15,21,23,84,200,137,116,124,101,168,-443,-299,526,1140,1529,1454,1395,1576,1943,1543,183,-394,-284,547,1163,1613,1654,1532,1692,2067,1644,15,0,-7,5,25,24,8,8,8,-2,-6,289,289,319,290,287,336,290,290,398,318,359,360,15.382961184,15.389781585,15.025360602,13.701102196,14.043917685,14.03144253,13.137508483,12.672372356,12.775827939,12.93381175,7.3689115085,7.0447189614,7.2014204767,7.8430828174,7.2925545589,7.8902207289,7.5290984289,8.6896267581,7.7845111303,8.5713103465,8.0140496756,8.3450626237,7.8239401249,5.8580193787,6.7513631259,6.1412218007,5.6084100542,3.9827455974,4.991316809,4.3625014039,0.7024837819,0.2143423619,0.2971116503,0.3192759377,1.1365020092,2.6300735763,1.7542287156,1.4482711263,1.5058960689,1.1940722,-6.351026845,-4.272557747,7.4419394317,15.82498126,20.687042524,19.1206349,17.862401885,19.676511165,23.596419854,18.242112917,-5.648543063,-4.058215385,7.739051082,16.144257198,21.823544533,21.750708476,19.6166306,21.124782291,25.102315922,19.436185117 +050,3,5,13,015,Georgia,Bartow County,100157,100083,100041,100110,100241,100923,101251,102063,103418,105190,106488,107757,109426,-42,69,131,682,328,812,1355,1772,1298,1269,1669,353,1278,1240,1277,1319,1345,1335,1375,1237,1239,1236,236,837,760,844,846,847,917,835,956,1017,1091,117,441,480,433,473,498,418,540,281,222,145,3,19,13,-3,-4,39,109,53,45,40,27,-166,-389,-358,263,-117,285,825,1179,967,1005,1500,-163,-370,-345,260,-121,324,934,1232,1012,1045,1527,4,-2,-4,-11,-24,-10,3,0,5,2,-3,990,990,988,1001,965,943,981,967,977,977,1033,1034,12.770358379,12.378276125,12.696108648,13.048166431,13.230766204,12.993902113,13.182620034,11.687563186,11.566197578,11.382106334,8.3636854175,7.5866853672,8.3911634288,8.3690286585,8.3319397582,8.9253994287,8.0054456205,9.0325872315,9.4938038227,10.04682687,4.4066729619,4.7915907582,4.3049452188,4.6791377724,4.8988264458,4.0685026839,5.1771744133,2.654975954,2.0723937548,1.3352794648,0.1898566582,0.1297722497,-0.02982641,-0.039569875,0.3836430349,1.060925341,0.5081300813,0.4251740852,0.3734042801,0.2486382452,-3.887065266,-3.573728107,2.6147819689,-1.157418857,2.8035452551,8.0299395078,11.303497469,9.1365186746,9.3817825387,13.813235843,-3.697208608,-3.443955857,2.5849555586,-1.196988732,3.18718829,9.0908648488,11.81162755,9.5616927598,9.7551868188,14.061874088 +050,3,5,13,017,Georgia,Ben Hill County,17634,17662,17649,17595,17608,17461,17462,17368,17267,17059,16794,16711,16614,-13,-54,13,-147,1,-94,-101,-208,-265,-83,-97,61,262,264,193,226,248,228,214,189,237,214,63,207,207,213,208,211,239,219,228,231,250,-2,55,57,-20,18,37,-11,-5,-39,6,-36,0,-3,-3,-3,0,4,21,9,8,7,9,-9,-106,-42,-122,-15,-135,-110,-213,-235,-97,-71,-9,-109,-45,-125,-15,-131,-89,-204,-227,-90,-62,-2,0,1,-2,-2,0,-1,1,1,1,1,308,308,308,312,299,312,314,297,309,344,299,298,14.867778913,14.9987217,11.006872166,12.942759786,14.240597186,13.165872672,12.468682631,11.165923256,14.147142218,12.843210803,11.746680286,11.760361333,12.147480681,11.911920511,12.115991961,13.801068284,12.760006992,13.470002659,13.788986718,15.003750938,3.1210986267,3.238360367,-1.140608515,1.030839275,2.1246052254,-0.635195611,-0.291324361,-2.304079402,0.3581554992,-2.160540135,-0.170241743,-0.170440019,-0.171091277,0,0.2296870514,1.2126461672,0.524383849,0.4726316722,0.4178480824,0.5401350338,-6.015208262,-2.38616027,-6.957711939,-0.859032729,-7.751937984,-6.351956114,-12.41041776,-13.88355537,-5.79018057,-4.261065266,-6.185450006,-2.55660029,-7.128803217,-0.859032729,-7.522250933,-5.139309947,-11.88603391,-13.4109237,-5.372332488,-3.720930233 +050,3,5,13,019,Georgia,Berrien County,19286,19291,19361,19380,19160,19059,18813,18989,18968,19071,19207,19377,19408,70,19,-220,-101,-246,176,-21,103,136,170,31,57,224,217,212,237,268,242,217,220,235,252,21,204,183,208,186,217,222,224,238,207,260,36,20,34,4,51,51,20,-7,-18,28,-8,0,6,35,28,13,34,6,3,4,1,1,34,-9,-295,-135,-315,93,-47,108,150,141,36,34,-3,-260,-107,-302,127,-41,111,154,142,37,0,2,6,2,5,-2,0,-1,0,0,2,176,184,216,343,196,182,193,190,206,178,202,199,11.563976149,11.261027504,11.093958502,12.515842839,14.179143961,12.751271175,11.409343043,11.494853441,12.181215011,12.994714451,10.531478279,9.4966268812,10.884638531,9.8225602028,11.480874028,11.697447111,11.777386367,12.435341449,10.729836202,13.407245069,1.0324978705,1.7644006227,0.2093199717,2.6932826362,2.6982699328,1.0538240641,-0.368043324,-0.940488009,1.4513788099,-0.412530618,0.3097493611,1.8162947587,1.4652398022,0.6865230249,1.7988466219,0.3161472192,0.1577328531,0.2089973353,0.0518349575,0.0515663272,-0.464624042,-15.30877011,-7.064549046,-16.63498099,4.9203745834,-2.476486551,5.6783827125,7.8374000731,7.3087290068,1.8563877788,-0.154874681,-13.49247535,-5.599309244,-15.94845796,6.7192212052,-2.160339331,5.8361155656,8.0463974084,7.3605639643,1.907954106 +050,3,5,13,021,Georgia,Bibb County,155547,155844,155878,156297,156701,155138,154447,154068,153212,152920,153069,153191,152737,34,419,404,-1563,-691,-379,-856,-292,149,122,-454,563,2294,2323,2169,2211,2225,2052,2103,2025,1922,1993,389,1607,1543,1691,1524,1675,1619,1658,1658,1749,1891,174,687,780,478,687,550,433,445,367,173,102,36,124,207,235,172,208,213,142,121,125,91,-161,-387,-554,-2325,-1566,-1129,-1503,-875,-335,-177,-650,-125,-263,-347,-2090,-1394,-921,-1290,-733,-214,-52,-559,-15,-5,-29,49,16,-8,1,-4,-4,1,3,6051,6015,6028,6225,6136,6033,6157,6120,6048,6058,6723,6719,14.69688476,14.843545326,13.911024599,14.283637773,14.423934006,13.355896902,13.739171338,13.235769913,12.551426892,13.029209487,10.295507328,9.8594879201,10.845340063,9.845438248,10.858467173,10.537620411,10.83192871,10.836990872,11.421667864,12.362385921,4.4013774325,4.9840574061,3.0656845359,4.4381995252,3.5654668331,2.8182764905,2.9072426274,2.3987790411,1.1297590283,0.6668235663,0.7944262033,1.3226921578,1.5071880041,1.1111649466,1.3483947296,1.3863577193,0.927704389,0.7908781035,0.8162998759,0.5949112209,-2.479378554,-3.539958722,-14.91154089,-10.11676922,-7.318931008,-9.782608696,-5.716488312,-2.189621196,-1.155880624,-4.249365864,-1.68495235,-2.217266564,-13.40435289,-9.005604277,-5.970536279,-8.396250976,-4.788783923,-1.398743092,-0.339580748,-3.654454643 +050,3,5,13,023,Georgia,Bleckley County,13063,13060,13033,13077,12888,12742,12706,12710,12868,12769,12833,12923,12955,-27,44,-189,-146,-36,4,158,-99,64,90,32,28,142,133,121,135,142,136,135,134,127,135,53,154,133,140,157,136,143,153,142,108,121,-25,-12,0,-19,-22,6,-7,-18,-8,19,14,1,10,10,18,7,11,14,12,11,10,9,-3,46,-208,-147,-18,-14,150,-93,62,59,9,-2,56,-198,-129,-11,-3,164,-81,73,69,18,0,0,9,2,-3,1,1,0,-1,2,0,1439,1404,1388,1260,1248,1265,1185,1365,1305,1308,1412,1413,10.877058598,10.244559985,9.4420600858,10.60987111,11.174063582,10.634138713,10.53165347,10.467932193,9.8617797795,10.433572919,11.796246649,10.244559985,10.92469762,12.338887142,10.70192005,11.181484088,11.935873932,11.092883368,8.386395403,9.3515727645,-0.919188051,0,-1.482637534,-1.729016033,0.4721435316,-0.547345375,-1.404220463,-0.624951176,1.4753843765,1.0820001546,0.7659900421,0.770267668,1.4046039797,0.5501414649,0.8655964747,1.0946907499,0.9361469751,0.8593078666,0.7765180929,0.6955715279,3.5235541938,-16.02156749,-11.4709325,-1.414649481,-1.10166824,11.728829463,-7.255139057,4.8433716116,4.5814567479,0.6955715279,4.2895442359,-15.25129983,-10.06632852,-0.864508016,-0.236071766,12.823520213,-6.318992082,5.7026794782,5.3579748408,1.3911430559 +050,3,5,13,025,Georgia,Brantley County,18411,18409,18462,18549,18522,18253,18368,18443,18425,18848,19021,19124,19202,53,87,-27,-269,115,75,-18,423,173,103,78,51,193,188,226,200,217,230,226,246,210,215,20,185,182,190,172,178,200,182,213,219,241,31,8,6,36,28,39,30,44,33,-9,-26,0,-7,-11,-15,-9,-3,12,6,5,5,4,22,87,-22,-296,99,41,-61,372,136,108,98,22,80,-33,-311,90,38,-49,378,141,113,102,0,-1,0,6,-3,-2,1,1,-1,-1,2,66,66,93,76,61,63,63,58,65,79,89,89,10.42933182,10.142699145,12.290958532,10.922694629,11.78995409,12.476944776,12.126740536,12.992157173,11.010617381,11.219537651,9.9970279106,9.8189959807,10.33310673,9.3935173807,9.6710222488,10.849517196,9.7657822016,11.249306821,11.482500983,12.576318948,0.4323039096,0.3237031642,1.9578518015,1.529177248,2.118931841,1.6274275795,2.3609583345,1.7428503525,-0.471883602,-1.356781297,-0.378265921,-0.593455801,-0.815771584,-0.491521258,-0.162994757,0.6509710318,0.3219488638,0.2640682352,0.2621575567,0.2087355842,4.7013050174,-1.186911602,-16.09789259,5.4067338412,2.2275950124,-3.309102745,19.960829555,7.1826559983,5.6626032245,5.1140218129,4.3230390965,-1.780367403,-16.91366417,4.9152125829,2.0646002554,-2.658131713,20.282778419,7.4467242335,5.9247607812,5.3227573971 +050,3,5,13,027,Georgia,Brooks County,16243,16314,16246,15982,15616,15648,15524,15672,15732,15641,15491,15518,15357,-68,-264,-366,32,-124,148,60,-91,-150,27,-161,45,195,221,224,214,193,181,189,164,183,155,61,177,156,205,198,200,197,226,199,221,215,-16,18,65,19,16,-7,-16,-37,-35,-38,-60,-2,2,7,13,17,22,38,24,21,20,19,-51,-286,-450,-2,-158,130,39,-79,-134,44,-120,-53,-284,-443,11,-141,152,77,-55,-113,64,-101,1,2,12,2,1,3,-1,1,-2,1,0,81,81,81,81,83,88,168,170,79,76,50,51,12.101278391,13.988227103,14.329580348,13.730270756,12.373381203,11.527193988,12.048576802,10.535783117,11.803024928,10.04048583,10.984237309,9.8740426609,13.114124872,12.703708456,12.822156687,12.546172462,14.407292895,12.784273416,14.253926279,13.927125506,1.1170410823,4.1141844421,1.2154554759,1.0265622995,-0.448775484,-1.018978474,-2.358716093,-2.248490299,-2.450901351,-3.886639676,0.1241156758,0.4430660168,0.8316274309,1.0907224432,1.4104372355,2.4200738759,1.5299780066,1.3490941796,1.2899480796,1.2307692308,-17.74854164,-28.48281537,-0.127942682,-10.13730271,8.3344018464,2.4837600306,-5.036177605,-8.608505718,2.8378857751,-7.773279352,-17.62442596,-28.03974935,0.7036847492,-9.046580264,9.7448390819,4.9038339065,-3.506199598,-7.259411538,4.1278338547,-6.542510121 +050,3,5,13,029,Georgia,Bryan County,30233,30238,30404,31300,32293,33082,33726,34860,35916,37091,38151,39692,40755,166,896,993,789,644,1134,1056,1175,1060,1541,1063,111,428,517,490,499,540,503,517,537,533,565,32,238,219,237,237,232,254,274,286,268,283,79,190,298,253,262,308,249,243,251,265,282,3,14,118,71,46,73,60,9,-19,2,5,84,688,563,458,338,747,748,921,827,1281,781,87,702,681,529,384,820,808,930,808,1283,786,0,4,14,7,-2,6,-1,2,1,-7,-5,119,120,120,120,121,121,122,119,119,120,120,120,13.872682484,16.259651219,14.990439771,14.938330739,15.746653836,14.213857805,14.163025463,14.273942745,13.694230695,14.046515097,7.7142486711,6.8875505166,7.2504780115,7.0949586876,6.7652290555,7.177574319,7.5061295492,7.6021371043,6.8856544583,7.0356880928,6.158433813,9.3721007029,7.7399617591,7.8433720513,8.9814247806,7.0362834859,6.6568959141,6.6718056405,6.8085762368,7.0108270041,0.4537793336,3.7111002783,2.17208413,1.3770805892,2.1287143149,1.6954899966,0.2465517005,-0.50503708,0.051385481,0.1243054433,22.300012965,17.706351328,14.011472275,10.118548677,21.78287114,21.137108624,25.230457353,21.982403445,32.912400601,19.416510249,22.753792299,21.417451606,16.183556405,11.495629266,23.911585455,22.832598621,25.477009054,21.477366365,32.963786082,19.540815692 +050,3,5,13,031,Georgia,Bulloch County,70217,70244,70560,72642,73114,71830,72667,73137,74660,76046,77332,79718,80839,316,2082,472,-1284,837,470,1523,1386,1286,2386,1121,186,842,811,858,836,929,872,901,939,887,893,145,494,468,488,465,514,530,565,537,572,636,41,348,343,370,371,415,342,336,402,315,257,22,90,139,132,113,111,169,124,117,91,86,233,1627,4,-1852,353,-48,1004,922,762,1975,775,255,1717,143,-1720,466,63,1173,1046,879,2066,861,20,17,-14,66,0,-8,8,4,5,5,3,4818,4796,4773,4983,5152,5514,5306,5346,5314,5508,6527,6525,11.759612296,11.128186833,11.839055083,11.571174488,12.743134619,11.799968876,11.957055459,12.244259281,11.29576568,11.123775357,6.8993449812,6.4216910453,6.7336350591,6.436119781,7.0505610271,7.1719994317,7.4980425464,7.0023080233,7.2843043617,7.9224200751,4.8602673147,4.7064957875,5.1054200243,5.135054707,5.6925735919,4.6279694446,4.4590129126,5.2419512577,4.0114613181,3.2013552819,1.2569656848,1.9072971267,1.8213930897,1.5640463124,1.5225919728,2.2869205735,1.6455880987,1.5256425302,1.158866603,1.0712706391,22.723146325,0.0548862483,-25.55469699,4.8859145865,-0.65841815,13.586202697,12.235743766,9.936235966,25.151225724,9.6538923871,23.98011201,1.962183375,-23.7333039,6.4499608988,0.8641738224,15.87312327,13.881331865,11.461878496,26.310092327,10.725163026 +050,3,5,13,033,Georgia,Burke County,23316,23334,23343,23513,23054,22832,22629,22644,22638,22553,22501,22497,22648,9,170,-459,-222,-203,15,-6,-85,-52,-4,151,80,324,316,309,325,322,346,302,340,271,288,89,239,228,217,265,232,264,240,252,229,248,-9,85,88,92,60,90,82,62,88,42,40,-1,-4,-2,0,0,3,6,-2,-2,-6,-2,20,90,-563,-320,-267,-75,-95,-145,-138,-40,113,19,86,-565,-320,-267,-72,-89,-147,-140,-46,111,-1,-1,18,6,4,-3,1,0,0,0,0,283,283,283,278,264,283,242,249,274,286,296,296,13.8296056,13.571842721,13.468160223,14.297969688,14.224813907,15.282010512,13.365493129,15.092999512,12.044979777,12.758888027,10.201468328,9.7923422166,9.4582225515,11.658344515,10.248934243,11.660262356,10.621583944,11.186576109,10.178230144,10.986820246,3.6281372716,3.7795005046,4.0099376716,2.6396251732,3.9758796634,3.621748156,2.7439091855,3.906423403,1.8667496333,1.7720677816,-0.170735872,-0.085897739,0,0,0.1325293221,0.2650059626,-0.0885132,-0.08878235,-0.266678519,-0.088603389,3.8415571111,-24.18021346,-13.94760929,-11.74633202,-3.313233053,-4.195927742,-6.417206966,-6.125982155,-1.777856794,5.006091483,3.6708212395,-24.26611119,-13.94760929,-11.74633202,-3.180703731,-3.930921779,-6.505720166,-6.214764505,-2.044535313,4.9174880939 +050,3,5,13,035,Georgia,Butts County,23655,23685,23776,23603,23431,23216,23337,23516,23738,24064,24172,24917,25426,91,-173,-172,-215,121,179,222,326,108,745,509,72,278,278,286,283,225,250,269,268,259,303,40,248,213,276,262,246,255,268,295,255,286,32,30,65,10,21,-21,-5,1,-27,4,17,-1,1,0,0,1,3,5,-1,-2,-2,-3,54,-204,-240,-225,104,194,222,324,136,743,497,53,-203,-240,-225,105,197,227,323,134,741,494,6,0,3,0,-5,3,0,2,1,0,-2,2345,2399,2472,2569,2440,2381,2662,2666,2702,2680,3014,3014,11.735156926,11.821235702,12.262310545,12.158185294,9.6045077156,10.581114826,11.254759215,11.112032507,10.552262218,12.037423276,10.468773085,9.057277714,11.833558428,11.255987799,10.500928436,10.792737123,11.212919962,12.231528319,10.389292917,11.362056294,1.2663838409,2.7639579878,0.428752117,0.9021974953,-0.89642072,-0.211622297,0.0418392536,-1.119495812,0.1629693007,0.6753669825,0.0422127947,0,0,0.0429617855,0.1280601029,0.2116222965,-0.041839254,-0.082925616,-0.08148465,-0.119182409,-8.611410118,-10.20538334,-9.646922632,4.4680256911,8.2812199859,9.3960299657,13.555918162,5.6389418691,30.271547597,19.744552371,-8.569197324,-10.20538334,-9.646922632,4.5109874766,8.4092800888,9.6076522622,13.514078909,5.5560162534,30.190062947,19.625369962 +050,3,5,13,037,Georgia,Calhoun County,6694,6697,6697,6625,6568,6598,6513,6536,6359,6393,6340,6184,6231,0,-72,-57,30,-85,23,-177,34,-53,-156,47,12,70,58,68,44,55,44,53,50,49,49,3,56,69,70,75,58,66,69,67,42,49,9,14,-11,-2,-31,-3,-22,-16,-17,7,0,2,1,8,6,-1,3,8,3,1,2,2,-12,-87,-54,24,-53,23,-163,46,-38,-164,45,-10,-86,-46,30,-54,26,-155,49,-37,-162,47,1,0,0,2,0,0,0,1,1,-1,0,1701,1704,1705,1690,1708,1693,1706,1646,1707,1710,1701,1700,10.508932593,8.7925414993,10.329636944,6.7119212875,8.4297647329,6.8243505235,8.3124215809,7.8536087332,7.824976046,7.8936770036,8.4071460742,10.460092473,10.633449795,11.440774922,8.889570082,10.236525785,10.82183187,10.523835703,6.7071223251,7.8936770036,2.1017865185,-1.667550974,-0.303812851,-4.728853634,-0.459805349,-3.412175262,-2.509410289,-2.670226969,1.1178537209,0,0.1501276085,1.2127643447,0.9114385539,-0.152543666,0.4598053491,1.2407910043,0.4705144291,0.1570721747,0.3193867774,0.3221908981,-13.06110194,-8.186159327,3.6457542154,-8.084814278,3.5251743429,-25.28111671,7.2145545797,-5.968742637,-26.18971575,7.2492952074,-12.91097433,-6.973394982,4.5571927693,-8.237357944,3.9849796919,-24.04032571,7.6850690088,-5.811670463,-25.87032897,7.5714861055 +050,3,5,13,039,Georgia,Camden County,50513,50525,50680,50344,51402,51478,52000,52549,52602,53211,53816,54784,55388,155,-336,1058,76,522,549,53,609,605,968,604,194,786,798,864,798,752,836,756,789,736,733,46,270,320,313,332,333,353,367,397,387,425,148,516,478,551,466,419,483,389,392,349,308,54,-19,259,127,97,147,137,39,-16,18,22,-45,-839,319,-615,-36,-19,-572,181,231,600,272,9,-858,578,-488,61,128,-435,220,215,618,294,-2,6,2,13,-5,2,5,0,-2,1,2,1877,1861,1855,1872,1911,1931,2381,1928,1895,2040,2018,2017,15.560658853,15.686120339,16.796267496,15.423568295,14.385599097,15.900942454,14.28935953,14.743943117,13.554327808,13.306466253,5.3452644916,6.2901735695,6.0847589425,6.4168228996,6.3702187491,6.714153931,6.9367658038,7.4186887421,7.1270718232,7.715208946,10.215394362,9.3959467694,10.711508554,9.0067453952,8.015380348,9.1867885232,7.3525937267,7.3252543751,6.4272559853,5.5912573068,-0.376148242,5.0911092328,2.4688958009,1.8747946423,2.8120785469,2.6057764548,0.7371494996,-0.298989974,0.3314917127,0.3993755219,-16.60991448,6.2705167771,-11.95567652,-0.695800073,-0.363465935,-10.87959221,3.4211297289,4.3166677567,11.049723757,4.9377337254,-16.98606272,11.36162601,-9.486780715,1.1789945689,2.4486126123,-8.273815751,4.1582792285,4.0176777822,11.38121547,5.3371092474 +050,3,5,13,043,Georgia,Candler County,10998,10987,11013,11199,11090,10950,10853,10864,10837,10698,10813,10835,10985,26,186,-109,-140,-97,11,-27,-139,115,22,150,39,151,158,152,145,129,128,136,128,136,128,14,128,133,113,134,142,156,137,141,108,128,25,23,25,39,11,-13,-28,-1,-13,28,0,-2,0,-3,11,7,15,11,1,1,-1,1,3,163,-133,-195,-115,11,-9,-138,127,-5,151,1,163,-136,-184,-108,26,2,-137,128,-6,152,0,0,2,5,0,-2,-1,-1,0,0,-2,287,289,299,288,281,290,282,263,277,284,268,267,13.596254277,14.177396922,13.793103448,13.300921891,11.880093936,11.796691397,12.630601347,11.900887918,12.564671101,11.732355637,11.525301639,11.934137916,10.254083485,12.291886438,13.077312704,14.37721764,12.723473415,13.109571847,9.977827051,11.732355637,2.0709526382,2.2432590067,3.5390199637,1.0090354538,-1.197218769,-2.580526243,-0.092872069,-1.208683929,2.5868440503,0,0,-0.269191081,0.998185118,0.6421134706,1.3814062716,1.0137781669,0.0928720687,0.0929756869,-0.092387288,0.0916590284,14.676751306,-11.93413792,-17.69509982,-10.54900702,1.0130312658,-0.829454864,-12.81634548,11.807912231,-0.461936438,13.840513291,14.676751306,-12.203329,-16.6969147,-9.906893547,2.3944375374,0.1843233031,-12.72347342,11.900887918,-0.554323725,13.932172319 +050,3,5,13,045,Georgia,Carroll County,110527,110565,110655,110733,111428,112290,113970,114501,116180,117437,118094,120115,121633,90,78,695,862,1680,531,1679,1257,657,2021,1518,386,1497,1518,1403,1446,1463,1563,1476,1494,1516,1545,186,987,861,964,982,1079,998,1149,1075,1120,1186,200,510,657,439,464,384,565,327,419,396,359,29,62,98,177,96,124,141,105,101,60,64,-138,-496,-36,255,1093,35,973,826,140,1564,1093,-109,-434,62,432,1189,159,1114,931,241,1624,1157,-1,2,-24,-9,27,-12,0,-1,-3,1,2,3583,3521,3443,3648,3728,4655,4087,3917,4118,3678,4110,4114,13.523768226,13.665764918,12.542575921,12.781755503,12.806877022,13.551181068,12.636066725,12.68622814,12.728318409,12.781905124,8.9164724375,7.7511354378,8.6179922939,8.6802793247,9.4454000727,8.6526415266,9.8366129177,9.1283100738,9.4035070044,9.811870212,4.6072957884,5.9146294804,3.9245836276,4.1014761778,3.3614769489,4.8985395416,2.7994538069,3.557918066,3.3248114051,2.9700349124,0.5601026253,0.882243058,1.5823492075,0.8485812782,1.0854769314,1.22246739,0.8989071857,0.8576365744,0.5037593038,0.529476976,-4.480821002,-0.324089287,2.2796556379,9.6614514276,0.3063846177,8.4358919894,7.0714031941,1.1888031724,13.131325853,9.0424739812,-3.920718377,0.5581537714,3.8620048454,10.510032706,1.3918615492,9.6583593794,7.9703103798,2.0464397468,13.635085156,9.5719509572 +050,3,5,13,047,Georgia,Catoosa County,63942,63928,64073,64771,64893,65258,65516,65841,66350,66570,67402,67585,67996,145,698,122,365,258,325,509,220,832,183,411,190,707,777,755,744,724,736,696,687,643,616,85,496,537,525,551,635,671,706,713,664,722,105,211,240,230,193,89,65,-10,-26,-21,-106,9,22,31,28,9,13,27,8,1,2,2,35,465,-147,117,68,230,419,227,860,203,516,44,487,-116,145,77,243,446,235,861,205,518,-4,0,-2,-10,-12,-7,-2,-5,-3,-1,-1,461,459,465,454,448,471,463,508,497,542,468,468,10.974511813,11.98482231,11.601908552,11.378408552,11.023394261,11.135402561,10.47246464,10.255874362,9.5268433257,9.0868189496,7.6992331812,8.282946693,8.0675523046,8.4267514949,9.6683085028,10.151977063,10.622931086,10.644015167,9.8379843985,10.650459873,3.2752786315,3.701875617,3.5343562477,2.9516570572,1.3550857587,0.983425498,-0.150466446,-0.388140806,-0.311141073,-1.563640923,0.3414982459,0.4781589339,0.4302694562,0.1376420389,0.1979338749,0.4084998222,0.1203731568,0.0149284925,0.0296324831,0.0295026589,7.2180311074,-2.267398815,1.7979116565,1.039962072,3.5019070168,6.339312056,3.4155883238,12.838503568,3.0076970375,7.6116860032,7.5595293533,-1.789239882,2.2281811127,1.1776041109,3.6998408916,6.7478118783,3.5359614806,12.85343206,3.0373295206,7.6411886621 +050,3,5,13,049,Georgia,Charlton County,12171,12167,12850,13452,13350,13103,13046,13238,12850,12779,12826,13277,13430,683,602,-102,-247,-57,192,-388,-71,47,451,153,39,130,146,130,106,111,122,110,104,106,107,5,95,122,118,114,104,99,96,136,107,106,34,35,24,12,-8,7,23,14,-32,-1,1,-4,-19,-8,7,79,101,137,64,65,50,45,569,579,-124,-272,-130,83,-553,-151,15,401,106,565,560,-132,-265,-51,184,-416,-87,80,451,151,84,7,6,6,2,1,5,2,-1,1,1,1791,2447,3130,3113,2948,2942,2989,2497,2313,2228,2578,2571,9.8851798342,10.89470935,9.8287528825,8.1073846036,8.4462030132,9.352959215,8.5840259082,8.1234133958,8.1216718385,8.0128805182,7.2237852635,9.103798224,8.9214833856,8.7192626869,7.91355958,7.5896964121,7.4915135198,10.62292521,8.1982913841,7.9379937844,2.6613945708,1.790911126,0.9072694968,-0.611878083,0.5326434333,1.7632628028,1.0925123883,-2.499511814,-0.076619546,0.0748867338,-1.444757053,-0.596970375,0.5292405398,6.0422960725,7.6852838229,10.502913217,4.9943423466,5.0771333724,3.8309772823,3.3699030217,44.027070185,-9.253040818,-20.56477526,-9.943018853,6.3156292802,-42.39497087,-11.78352647,1.1716461629,30.724437804,7.9379937844,42.582313132,-9.850011193,-20.03553472,-3.900722781,14.000913103,-31.89205765,-6.789184127,6.2487795352,34.555415086,11.307896806 +050,3,5,13,051,Georgia,Chatham County,265128,265112,265799,271665,276243,277790,282396,286239,289055,289771,289771,290185,289463,687,5866,4578,1547,4606,3843,2816,716,0,414,-722,867,3813,4006,3950,3907,4079,4089,3756,3616,3522,3528,498,2245,2128,2270,2321,2397,2391,2458,2438,2534,2836,369,1568,1878,1680,1586,1682,1698,1298,1178,988,692,141,390,888,836,575,888,1018,640,532,412,377,172,3877,1751,-944,2380,1264,108,-1196,-1688,-981,-1789,313,4267,2639,-108,2955,2152,1126,-556,-1156,-569,-1412,5,31,61,-25,65,9,-8,-26,-22,-5,-2,12870,12986,13117,13741,13671,13979,13811,13758,14292,14884,14730,14736,14.1888573,14.622892894,14.25907843,13.948938388,14.346637122,14.21534033,12.977993387,12.478819482,12.145748988,12.172904935,8.354047899,7.7677274287,8.1944577309,8.2865334014,8.4307156612,8.3122716385,8.4930531801,8.4135403474,8.7385939623,9.7852489787,5.8348094012,6.8551654657,6.0646206995,5.6624049869,5.915921461,5.9030686918,4.4849402066,4.0652791342,3.4071550256,2.3876559567,1.4512599914,3.2414200924,3.0178707767,2.052889576,3.1232688807,3.5390600284,2.211372675,1.8359325122,1.4207974398,1.3007894446,14.427012786,6.3915839886,-3.40773925,8.4971777231,4.4457340825,0.3754601995,-4.132502686,-5.825289625,-3.383015263,-6.172711715,15.878272777,9.633004081,-0.389868474,10.550067299,7.5690029632,3.9145202279,-1.921130011,-3.989357113,-1.962217823,-4.87192227 +050,3,5,13,053,Georgia,Chattahoochee County,11267,11263,11185,11270,12293,12271,11738,11075,10065,10197,10548,10991,10551,-78,85,1023,-22,-533,-663,-1010,132,351,443,-440,50,222,308,266,218,232,210,183,227,205,198,1,38,32,34,34,37,39,40,35,28,32,49,184,276,232,184,195,171,143,192,177,166,74,92,514,252,182,261,126,35,-20,24,25,-218,-191,232,-514,-914,-1137,-1315,-46,177,241,-626,-144,-99,746,-262,-732,-876,-1189,-11,157,265,-601,17,0,1,8,15,18,8,0,2,1,-5,3267,3262,3259,2975,3145,3120,2978,2552,2504,2518,2704,2697,19.772879092,26.142681322,21.657710471,18.15985672,20.339280235,19.867549669,18.063369855,21.884791516,19.035238405,18.382694272,3.3845468715,2.7161227348,2.768278782,2.8322712316,3.2437645202,3.6896877956,3.9482775639,3.3743070619,2.5999350016,2.9709404883,16.38833222,23.426558588,18.889431689,15.327585489,17.095515715,16.177861873,14.115092291,18.510484454,16.435303403,15.411753783,8.19416611,43.627721428,20.517830972,15.160981299,22.881690264,11.920529801,3.4547428684,-1.928175464,2.2285157157,2.3210472565,-17.01180138,19.691889827,-41.84986159,-76.13811487,-99.68000701,-124.4087039,-4.540519198,17.064352856,22.378011978,-58.1190233,-8.817635271,63.319611255,-21.33203061,-60.97713357,-76.79831675,-112.4881741,-1.08577633,15.136177392,24.606527694,-55.79797605 +050,3,5,13,055,Georgia,Chattooga County,26015,26022,25958,25689,25635,25062,24871,24918,24847,24757,24836,24846,24843,-64,-269,-54,-573,-191,47,-71,-90,79,10,-3,48,303,292,251,297,300,300,314,279,300,307,96,266,316,331,323,331,303,336,337,322,312,-48,37,-24,-80,-26,-31,-3,-22,-58,-22,-5,3,7,2,5,6,7,8,9,6,6,6,-16,-315,-27,-514,-174,75,-76,-76,132,27,-6,-13,-308,-25,-509,-168,82,-68,-67,138,33,0,-3,2,-5,16,3,-4,0,-1,-1,-1,2,1941,1944,1946,1967,1572,1486,1378,1335,1336,1314,1277,1274,11.733498558,11.37869223,9.9019665858,11.89594056,12.050854606,12.056666332,12.660269333,11.251587926,12.076808502,12.356859667,10.300695103,12.313927208,13.057971872,12.93733603,13.296109582,12.177232995,13.547294573,13.59062771,12.962441126,12.558111453,1.4328034542,-0.935234978,-3.156005286,-1.04139547,-1.245254976,-0.120566663,-0.88702524,-2.339039784,-0.885632623,-0.201251786,0.2710709238,0.0779362481,0.1972503304,0.2403220315,0.2811866075,0.3215111022,0.3628739618,0.2419696328,0.24153617,0.2415021433,-12.19819157,-1.05213935,-20.27733396,-6.969338914,3.0127136516,-3.054355471,-3.064269011,5.3233319218,1.0869127652,-0.241502143,-11.92712065,-0.974203102,-20.08008363,-6.729016883,3.2939002591,-2.732844369,-2.701395049,5.5653015547,1.3284489352,0 +050,3,5,13,057,Georgia,Cherokee County,214346,214400,215226,217769,220690,224372,230239,235424,241929,247944,254277,259475,265274,826,2543,2921,3682,5867,5185,6505,6015,6333,5198,5799,663,2848,2783,2735,2866,2810,2849,2842,2781,2774,2695,261,1213,1224,1268,1279,1466,1456,1622,1648,1700,1855,402,1635,1559,1467,1587,1344,1393,1220,1133,1074,840,47,91,97,92,113,342,488,321,274,276,228,368,823,1276,2113,4066,3470,4604,4456,4914,3852,4740,415,914,1373,2205,4179,3812,5092,4777,5188,4128,4968,9,-6,-11,10,101,29,20,18,12,-4,-9,1406,1421,1420,1367,1443,1622,1167,1656,1566,1730,1625,1624,13.154886315,12.694459459,12.290422458,12.608581842,12.068813713,11.936659034,11.60300731,11.074805713,10.798984724,10.271577459,5.6028360605,5.5831902185,5.6980825143,5.6267886171,6.2963988979,6.1003073197,6.6221245098,6.5628478299,6.6179791028,7.0700468224,7.5520502546,7.1112692407,6.5923399436,6.9817932254,5.772414815,5.8363517146,4.9808828002,4.5119578831,4.1810056214,3.2015306366,0.4203281793,0.442458702,0.4134255452,0.4971283141,1.4688734127,2.0446084973,1.3105437532,1.0911530979,1.074448372,0.8689868871,3.8014295777,5.8203845742,9.4953062719,17.887820576,14.903481702,19.289708036,18.192470293,19.569074173,14.995562061,18.065780021,4.221757757,6.2628432761,9.9087318171,18.38494889,16.372355115,21.334316533,19.503014046,20.66022727,16.070010433,18.934766908 +050,3,5,13,059,Georgia,Clarke County,116714,116670,117389,118229,119915,120927,120437,123621,124873,126674,127179,128238,127795,719,840,1686,1012,-490,3184,1252,1801,505,1059,-443,363,1454,1437,1399,1370,1350,1364,1314,1349,1294,1298,201,635,629,686,740,750,720,792,792,756,834,162,819,808,713,630,600,644,522,557,538,464,77,238,330,458,330,512,585,355,308,257,221,416,-218,526,-144,-1477,2029,25,913,-354,261,-1128,493,20,856,314,-1147,2541,610,1268,-46,518,-907,64,1,22,-15,27,43,-2,11,-6,3,0,9183,9904,10664,11698,11376,10306,11704,10206,10248,10107,10411,10411,12.342011222,12.068328406,11.617575008,11.352148622,11.062944054,10.978132269,10.447351787,10.628198209,10.132450072,10.139317979,5.3900805541,5.2825181403,5.6966808115,6.1318175039,6.1460800302,5.794908529,6.2970339539,6.2398317136,5.919731263,6.5147852035,6.9519306674,6.7858102661,5.9208941962,5.2203311181,4.9168640241,5.1832237398,4.1503178332,4.3883664956,4.2127188088,3.6245327751,2.0202191683,2.7714324106,3.8033233406,2.7344591571,4.1957239673,4.7083631798,2.8225341586,2.426601222,2.0123954161,1.726339964,-1.850452852,4.417495297,-1.195804718,-12.23877629,16.627195175,0.2012121017,7.259080808,-2.78901569,2.0437167456,-8.81136416,0.1697663167,7.1889277076,2.6075186222,-9.504317131,20.822919142,4.9095752815,10.081614967,-0.362414468,4.0561121617,-7.085024196 +050,3,5,13,061,Georgia,Clay County,3183,3186,3176,3163,3107,3017,3074,3080,3015,2971,2901,2901,2866,-10,-13,-56,-90,57,6,-65,-44,-70,0,-35,4,33,42,39,27,41,31,29,13,34,31,3,42,38,48,40,37,40,45,46,25,44,1,-9,4,-9,-13,4,-9,-16,-33,9,-13,0,-1,-2,-2,-3,0,8,2,2,2,2,-11,-3,-59,-81,71,2,-63,-31,-39,-12,-23,-11,-4,-61,-83,68,2,-55,-29,-37,-10,-21,0,0,1,2,2,0,-1,1,0,1,-1,58,58,58,58,58,58,58,55,55,57,58,57,10.411736867,13.397129187,12.736773351,8.8655393203,13.324666883,10.172272354,9.6892749749,4.4277929155,11.720096518,10.750823652,13.251301467,12.121212121,15.676028739,13.134132326,12.024699383,13.125512715,15.035081858,15.667574932,8.6177180283,15.25923357,-2.8395646,1.2759170654,-2.939255389,-4.268593006,1.2999675008,-2.953240361,-5.345806883,-11.23978202,3.1023784902,-4.508409919,-0.315507178,-0.637958533,-0.653167864,-0.985059924,0,2.6251025431,0.6682258603,0.6811989101,0.6894174423,0.6936015259,-0.946521533,-18.81977671,-26.4532985,23.313084879,0.6499837504,-20.67268253,-10.35750084,-13.28337875,-4.136504654,-7.976417548,-1.262028711,-19.45773525,-27.10646636,22.328024955,0.6499837504,-18.04757998,-9.689274975,-12.60217984,-3.447087211,-7.282816022 +050,3,5,13,063,Georgia,Clayton County,259424,259639,259899,262081,265371,264133,266757,272874,279346,284175,289229,292404,292646,260,2182,3290,-1238,2624,6117,6472,4829,5054,3175,242,1081,4370,4176,4146,4126,4404,4294,4338,4304,4314,4046,387,1437,1396,1526,1511,1645,1573,1879,1882,1896,1982,694,2933,2780,2620,2615,2759,2721,2459,2422,2418,2064,117,363,622,725,541,788,967,571,488,345,302,-567,-1117,-62,-4740,-491,2557,2780,1794,2140,395,-2132,-450,-754,560,-4015,50,3345,3747,2365,2628,740,-1830,16,3,-50,157,-41,13,4,5,4,17,8,4037,4219,4420,4207,4096,4459,4515,4280,4556,4699,4778,4775,16.743936549,15.83461623,15.659938357,15.54370962,16.322264659,15.551772844,15.39605445,15.012103159,14.834096415,13.83129647,5.5059580827,5.2933726671,5.7638846921,5.6923279775,6.096758711,5.6970048169,6.6687843044,6.56430719,6.5195750585,6.7754892744,11.237978467,10.541243563,9.8960536653,9.8513816421,10.225505948,9.8547680272,8.7272701461,8.4477959693,8.3145213563,7.055807196,1.3908578873,2.358508452,2.7384117967,2.038086986,2.9205142032,3.5022273731,2.02654382,1.7021157857,1.1863150818,1.032390394,-4.279857466,-0.235092482,-17.90354747,-1.849724048,9.4768462153,10.06845098,6.3671096552,7.4641962735,1.3582448039,-7.28826596,-2.888999579,2.1234159696,-15.16513567,0.1883629377,12.397360419,13.570678353,8.3936534752,9.1663120592,2.5445598857,-6.255875566 +050,3,5,13,065,Georgia,Clinch County,6798,6792,6764,6719,6688,6756,6780,6828,6762,6658,6601,6637,6582,-28,-45,-31,68,24,48,-66,-104,-57,36,-55,17,109,96,98,104,97,106,84,85,90,91,29,84,63,65,73,72,91,92,93,55,78,-12,25,33,33,31,25,15,-8,-8,35,13,0,3,9,14,15,13,24,13,10,12,10,-16,-73,-75,21,-23,12,-105,-110,-58,-10,-78,-16,-70,-66,35,-8,25,-81,-97,-48,2,-68,0,0,2,0,1,-2,0,1,-1,-1,0,155,155,155,146,127,132,148,141,142,126,126,126,16.168508492,14.320877154,14.578994347,15.36643026,14.256319812,15.599705666,12.518628912,12.82147975,13.597220124,13.768061124,12.460134985,9.3980756321,9.6697411485,10.786052009,10.582010582,13.392200147,13.710879285,14.028207255,8.3094122979,11.801195249,3.7083735074,4.9228015216,4.9092531985,4.5803782506,3.6743092299,2.2075055188,-1.192250373,-1.206727506,5.287807826,1.9668658749,0.4450048209,1.3425822332,2.0827134781,2.2163120567,1.9106407995,3.53200883,1.9374068554,1.5084093823,1.8129626832,1.5129737499,-10.82845064,-11.18818528,3.1240702172,-3.398345154,1.7636684303,-15.45253863,-16.39344262,-8.748774417,-1.510802236,-11.80119525,-10.38344582,-9.845603043,5.2067836953,-1.182033097,3.6743092299,-11.9205298,-14.45603577,-7.240365035,0.3021604472,-10.2882215 +050,3,5,13,067,Georgia,Cobb County,688078,688076,689542,696629,706517,716265,727847,739428,748767,753361,757133,761060,762944,1466,7087,9888,9748,11582,11581,9339,4594,3772,3927,1884,2321,9482,9486,9232,9305,9750,9445,9357,9108,8669,8769,933,3744,3664,3842,3977,4161,4142,4209,4507,4617,5210,1388,5738,5822,5390,5328,5589,5303,5148,4601,4052,3559,469,1405,2085,2639,1720,2613,3878,2430,2005,1937,1474,-357,-38,2091,1815,4549,3417,191,-2973,-2827,-2088,-3199,112,1367,4176,4454,6269,6030,4069,-543,-822,-151,-1725,-34,-18,-110,-96,-15,-38,-33,-11,-7,26,50,9068,9129,9107,9151,9023,9255,9136,9308,9362,9332,9696,9693,13.680851785,13.521044852,12.97739218,12.886812103,13.28994224,12.693229046,12.458325788,12.059630823,11.420155408,11.507843811,5.4019309306,5.2225498986,5.4006868234,5.5078830451,5.6717384267,5.5664748235,5.6040497215,5.9675841149,6.0822306518,6.8372523957,8.2789208546,8.2984949535,7.5767053561,7.3789290581,7.6182038132,7.1267542224,6.854276067,6.0920467079,5.3379247566,4.6705914158,2.0271669224,2.9718931601,3.7096336614,2.382086708,3.5617045203,5.2116826088,3.2354100316,2.654760628,2.5517177329,1.934378125,-0.05482729,2.9804453706,2.5513395587,6.3000653689,4.6576136034,0.2566867917,-3.958384372,-3.743146282,-2.750638423,-4.198151711,1.972339632,5.9523385307,6.2609732201,8.6821520768,8.2193181237,5.4683694005,-0.72297434,-1.088385654,-0.198920691,-2.263773586 +050,3,5,13,069,Georgia,Coffee County,42356,42346,42729,42998,43131,43084,42893,42998,42924,42871,43060,43278,43218,383,269,133,-47,-191,105,-74,-53,189,218,-60,124,593,593,579,642,573,596,594,597,565,555,40,395,365,390,359,396,422,451,445,430,453,84,198,228,189,283,177,174,143,152,135,102,5,22,43,34,1,18,2,4,0,0,1,256,49,-139,-272,-480,-86,-250,-199,37,81,-164,261,71,-96,-238,-479,-68,-248,-195,37,81,-163,38,0,1,2,5,-4,0,-1,0,2,1,2657,3054,3425,3317,3184,3115,3087,3107,3031,3168,3280,3277,13.834614532,13.770042611,13.431537435,14.934226595,13.342492229,13.873047648,13.846960779,13.894869139,13.088095624,12.832963374,9.2152997305,8.4756586051,9.0471495679,8.3510706352,9.2209893935,9.8228625963,10.513433184,10.357147013,9.960851537,10.474472808,4.6193148016,5.2943840054,4.3843878675,6.5831559603,4.121502835,4.0501850516,3.3335275948,3.5377221259,3.1272440872,2.358490566,0.5132572002,0.9985022466,0.7887258598,0.0232620352,0.4191358815,0.0465538512,0.0932455271,0,0,0.0231224565,1.143163764,-3.227716565,-6.309806878,-11.16577689,-2.002538101,-5.819231396,-4.638964975,0.8611560438,1.8763464523,-3.792082871,1.6564209642,-2.229214318,-5.521081018,-11.14251486,-1.583402219,-5.772677545,-4.545719448,0.8611560438,1.8763464523,-3.768960414 +050,3,5,13,071,Georgia,Colquitt County,45498,45496,45638,45778,46029,46139,45880,45486,45471,45501,45467,45569,45542,142,140,251,110,-259,-394,-15,30,-34,102,-27,189,763,723,692,625,658,656,597,645,583,586,72,448,459,500,464,455,491,475,550,482,504,117,315,264,192,161,203,165,122,95,101,82,7,7,34,38,21,39,47,2,-6,-18,-12,23,-182,-42,-111,-443,-641,-227,-92,-122,20,-99,30,-175,-8,-73,-422,-602,-180,-90,-128,2,-111,-5,0,-5,-9,2,5,0,-2,-1,-1,2,1005,1017,1040,1018,966,977,951,934,955,1051,1232,1231,16.692920277,15.750432974,15.016057634,13.584151099,14.403607469,14.424398342,13.124917557,14.180810835,12.808119865,12.863430321,9.8013476853,9.9992375309,10.849752626,10.084873776,9.9599413349,10.796310344,10.442773601,12.092164278,10.589217452,11.063428126,6.8915725912,5.7511954426,4.1663050082,3.4992773232,4.443666134,3.6280879976,2.6821439564,2.088646557,2.2189024122,1.8000021951,0.1531460576,0.7406842615,0.8245811995,0.4564274769,0.8537092573,1.033455369,0.0439695731,-0.131914519,-0.395447955,-0.263414955,-3.981797497,-0.914962911,-2.408645083,-9.628446299,-14.03147779,-4.991369548,-2.022600361,-2.682261894,0.4393866163,-2.173173382,-3.82865144,-0.17427865,-1.584063883,-9.172018822,-13.17776854,-3.957914179,-1.978630787,-2.814176414,0.0439386616,-2.436588337 +050,3,5,13,073,Georgia,Columbia County,124053,124013,124951,128832,132601,136232,139223,143991,147622,151757,154399,157129,160377,938,3881,3769,3631,2991,4768,3631,4135,2642,2730,3248,405,1616,1718,1494,1723,1719,1908,1837,1815,1799,1789,137,772,776,857,818,891,884,961,1003,1043,1138,268,844,942,637,905,828,1024,876,812,756,651,81,153,335,226,203,327,375,159,69,107,95,556,2867,2432,2713,1861,3575,2228,3095,1767,1871,2514,637,3020,2767,2939,2064,3902,2603,3254,1836,1978,2609,33,17,60,55,22,38,4,5,-6,-4,-12,640,641,639,806,777,743,767,691,766,797,714,715,12.735289598,13.142946759,11.1147069,12.510210379,12.139230405,13.085836365,12.272069851,11.856700506,11.549523638,11.26907838,6.0839378524,5.936511458,6.3757053636,5.9392641266,6.2920618331,6.0628298464,6.4199559755,6.5522152105,6.6960273234,7.1683684718,6.6513517454,7.2064353008,4.7390015363,6.5709462526,5.8471685722,7.0230065189,5.8521138757,5.3044852951,4.8534963149,4.1007099078,1.2057545226,2.5627981165,1.6813412044,1.4739249605,2.3092078781,2.5719018014,1.0621987514,0.4507505977,0.6869366477,0.5984138882,22.594105988,18.605149312,20.183534016,13.512188924,25.245927108,15.280525902,20.676132928,11.543134872,12.011761383,15.835921211,23.799860511,21.167947428,21.86487522,14.986113884,27.555134986,17.852427704,21.73833168,11.99388547,12.69869803,16.434335099 +050,3,5,13,075,Georgia,Cook County,17212,17205,17184,17036,16906,17055,17307,17076,17175,17217,17161,17241,17291,-21,-148,-130,149,252,-231,99,42,-56,80,50,56,238,208,228,235,222,219,186,227,209,211,78,178,158,186,185,197,189,197,186,203,211,-22,60,50,42,50,25,30,-11,41,6,0,1,5,2,2,-1,0,0,-1,-1,-1,0,0,-213,-190,103,201,-257,71,55,-95,74,50,1,-208,-188,105,200,-257,71,54,-96,73,50,0,0,8,2,2,1,-2,-1,-1,1,0,143,143,156,142,139,149,142,141,145,145,143,143,13.909994155,12.256201756,13.427166456,13.677900006,12.913358346,12.787947797,10.816468946,13.206120193,12.150456369,12.220549056,10.40327294,9.3099994108,10.953741056,10.767708515,11.459151325,11.036174126,11.456152594,10.820873815,11.80163944,12.220549056,3.5067212157,2.9462023452,2.4734253997,2.9101914906,1.4542070209,1.7517736708,-0.639683647,2.3852463785,0.3488169292,0,0.292226768,0.1178480938,0.1177821619,-0.05820383,0,0,-0.058153059,-0.058176741,-0.058136155,0,-12.44886032,-11.19556891,6.0657813374,11.698969792,-14.94924817,4.1458643543,3.1984182368,-5.526790389,4.3020754607,2.8958647052,-12.15663355,-11.07772082,6.1835634993,11.640765962,-14.94924817,4.1458643543,3.1402651779,-5.58496713,4.2439393059,2.8958647052 +050,3,5,13,077,Georgia,Coweta County,127317,127368,127939,129390,130614,132980,135191,138217,140561,143218,146063,148504,150849,571,1451,1224,2366,2211,3026,2344,2657,2845,2441,2345,396,1633,1586,1673,1683,1640,1627,1657,1688,1617,1630,170,875,816,939,961,966,1026,1082,1063,1125,1211,226,758,770,734,722,674,601,575,625,492,419,13,17,77,143,105,251,285,203,186,120,108,311,676,403,1470,1360,2082,1456,1875,2032,1829,1817,324,693,480,1613,1465,2333,1741,2078,2218,1949,1925,21,0,-26,19,24,19,2,4,2,0,1,588,588,596,587,535,507,581,498,592,586,639,637,12.691923569,12.199812311,12.693763894,12.551692763,11.996722846,11.67237013,11.678101621,11.67031364,10.978826549,10.890153097,6.8006326531,6.2768265104,7.1245931243,7.1670687733,7.0663623596,7.3606956073,7.6256523562,7.3492555681,7.6383301592,8.0907824542,5.8912909155,5.9229858002,5.5691707702,5.3846239899,4.9303604869,4.3116745224,4.0524492651,4.3210580716,3.3404963896,2.7993706427,0.1321265773,0.59229858,1.0850019348,0.7830824362,1.8360838015,2.0446376687,1.430690784,1.2859468821,0.814755217,0.7215561561,5.253974484,3.0999523084,11.153516393,10.142782031,15.229985955,10.445587528,13.214508473,14.048624002,12.418227432,12.139514219,5.3861010613,3.6922508884,12.238518327,10.925864467,17.066069757,12.490225197,14.645199257,15.334570884,13.232982649,12.861070375 +050,3,5,13,079,Georgia,Crawford County,12630,12593,12577,12576,12567,12474,12395,12351,12250,12236,12273,12345,12231,-16,-1,-9,-93,-79,-44,-101,-14,37,72,-114,51,136,143,125,128,143,114,119,121,116,104,38,100,117,105,133,117,113,170,127,141,159,13,36,26,20,-5,26,1,-51,-6,-25,-55,0,4,7,17,12,16,-1,0,-1,-1,-1,-29,-41,-43,-131,-88,-86,-100,38,43,99,-58,-29,-37,-36,-114,-76,-70,-101,38,42,98,-59,0,0,1,1,2,0,-1,-1,1,-1,0,133,134,143,135,135,135,150,135,142,133,142,142,10.813819425,11.37493537,9.983626852,10.293940247,11.557423422,9.2679159384,9.7198399085,9.8739238647,9.4239987001,8.4635416667,7.9513378126,9.3067653025,8.3862465556,10.696047288,9.4560737089,9.1866184301,13.885485584,10.363539924,11.455032903,12.939453125,2.8624816125,2.0681700672,1.5973802963,-0.402107041,2.1013497131,0.0812975082,-4.165645675,-0.489616059,-2.031034203,-4.475911458,0.3180535125,0.5568150181,1.3577732519,0.9650568981,1.293138285,-0.081297508,0,-0.081602677,-0.081241368,-0.081380208,-3.260048503,-3.420435111,-10.46284094,-7.07708392,-6.950618282,-8.129750823,3.1038144246,3.5089150924,8.0428954424,-4.720052083,-2.941994991,-2.863620093,-9.105067689,-6.112027022,-5.657479997,-8.211048331,3.1038144246,3.4273124158,7.9616540743,-4.801432292 +050,3,5,13,081,Georgia,Crisp County,23439,23435,23436,23753,23593,23304,23064,22961,22882,22675,22572,22382,22034,1,317,-160,-289,-240,-103,-79,-207,-103,-190,-348,81,336,294,296,272,318,304,277,283,243,237,29,254,228,267,254,238,252,232,284,253,317,52,82,66,29,18,80,52,45,-1,-10,-80,0,8,10,18,12,25,2,0,-1,-1,-1,-54,224,-240,-344,-279,-206,-133,-250,-102,-177,-266,-54,232,-230,-326,-267,-181,-131,-250,-103,-178,-267,3,3,4,8,9,-2,0,-2,1,-2,-1,506,503,485,437,350,415,436,414,448,439,471,467,14.240606921,12.41921176,12.623408747,11.732229124,13.81857686,13.26265733,12.16059003,12.509116627,10.811051297,10.671829971,10.765220708,9.6312254467,11.386655863,10.955831608,10.342205323,10.994044892,10.185042913,12.553318452,11.255950527,14.274135447,3.4753862129,2.7879863135,1.236752884,0.7763975155,3.4763715372,2.2686124381,1.9755471168,-0.044201826,-0.44489923,-3.602305476,0.3390620696,0.4224221687,0.7676397211,0.5175983437,1.0863661054,0.0872543245,0,-0.044201826,-0.044489923,-0.045028818,9.4937379474,-10.13813205,-14.670448,-12.03416149,-8.951656708,-5.802412582,-10.97526176,-4.508586205,-7.874716377,-11.97766571,9.832800017,-9.71570988,-13.90280828,-11.51656315,-7.865290603,-5.715158258,-10.97526176,-4.55278803,-7.9192063,-12.02269452 +050,3,5,13,083,Georgia,Dade County,16633,16644,16632,16605,16528,16466,16299,16176,16249,16270,16238,16103,16057,-12,-27,-77,-62,-167,-123,73,21,-32,-135,-46,23,146,203,155,171,163,173,147,158,149,145,29,143,156,181,179,201,189,180,192,196,198,-6,3,47,-26,-8,-38,-16,-33,-34,-47,-53,0,7,0,-6,-5,-7,-3,-5,-5,-5,-3,-4,-37,-127,-30,-153,-79,94,60,8,-82,9,-4,-30,-127,-36,-158,-86,91,55,3,-87,6,-2,0,3,0,-1,1,-2,-1,-1,-1,1,993,991,979,978,1057,974,950,971,970,1018,984,984,8.7853897765,12.253644403,9.3956476935,10.437967343,10.038491147,10.67077872,9.0408684154,9.7206841393,9.214310009,9.0174129353,8.6048680687,9.4165937283,10.971691823,10.926293301,12.378752887,11.65767155,11.070451121,11.812476929,12.120837327,12.313432836,0.1805217077,2.8370506746,-1.576044129,-0.488325958,-2.34026174,-0.98689283,-2.029582705,-2.091792789,-2.906527318,-3.2960199,0.421217318,0,-0.363702491,-0.305203723,-0.431100847,-0.185042406,-0.307512531,-0.307616587,-0.309205034,-0.186567164,-2.226434395,-7.666073099,-1.818512457,-9.339233939,-4.865280985,5.7979953739,3.6901503736,0.4921865387,-5.070962555,0.5597014925,-1.805217077,-7.666073099,-2.182214948,-9.644437662,-5.296381832,5.6129529684,3.3826378425,0.184569952,-5.380167589,0.3731343284 +050,3,5,13,085,Georgia,Dawson County,22330,22377,22325,22334,22511,22730,23024,23371,23664,24410,25106,26091,27113,-52,9,177,219,294,347,293,746,696,985,1022,55,244,222,232,249,216,229,274,237,291,291,31,166,175,183,158,212,200,221,258,256,252,24,78,47,49,91,4,29,53,-21,35,39,-3,-8,-4,3,6,30,30,7,4,3,0,-78,-59,137,166,194,310,234,684,712,948,988,-81,-67,133,169,200,340,264,691,716,951,988,5,-2,-3,1,3,3,0,2,1,-1,-5,299,239,180,141,143,142,137,139,121,102,110,110,10.927248707,9.9007693165,10.25618355,10.884294269,9.3113482056,9.7374295737,11.399093065,9.5726633815,11.367853585,10.939027141,7.4341118252,7.8046604973,8.0900068522,6.9064999781,9.1389158314,8.5043053046,9.1941590049,10.420874061,10.000585972,9.472971957,3.4931368817,2.0961088193,2.1661766981,3.9777942912,0.1724323742,1.2331242692,2.20493406,-0.848210679,1.3672676133,1.4660551838,-0.358270449,-0.17839224,0.1326230632,0.2622721511,1.2932428063,1.2756457957,0.291217706,0.1615639389,0.1171943669,0,-2.642244564,6.1099342179,7.338476161,8.4801328846,13.363508999,9.9500372063,28.456130133,28.758381129,37.033419927,37.140064657,-3.000515014,5.9315419779,7.4710992242,8.7424050356,14.656751805,11.225683002,28.747347839,28.919945068,37.150614294,37.140064657 +050,3,5,13,087,Georgia,Decatur County,27842,27841,27815,27655,27449,27401,27183,27063,26682,26727,26613,26496,26457,-26,-160,-206,-48,-218,-120,-381,45,-114,-117,-39,90,372,372,363,366,345,364,393,364,375,349,56,314,319,275,316,307,316,306,379,324,342,34,58,53,88,50,38,48,87,-15,51,7,-4,-7,-11,-5,-4,-6,5,0,0,-3,2,-58,-212,-252,-131,-267,-150,-437,-40,-99,-165,-48,-62,-219,-263,-136,-271,-156,-432,-40,-99,-168,-46,2,1,4,0,3,-2,3,-2,0,0,0,1069,1068,1058,1042,1058,1071,1134,961,1021,1035,1053,1053,13.412655489,13.50174216,13.23609845,13.41052323,12.719831877,13.545446088,14.716620794,13.648293963,14.121900243,13.181500576,11.32143501,11.578106852,10.027347311,11.578484538,11.318806917,11.759233417,11.458742908,14.21072366,12.20132181,12.917115178,2.0912204795,1.9236353078,3.2087511395,1.8320386927,1.4010249604,1.7862126709,3.2578778857,-0.562429696,1.920578433,0.2643853984,-0.252388679,-0.399245064,-0.182315406,-0.146563095,-0.221214467,0.1860638199,0,0,-0.112975202,0.0755386852,-7.643771408,-9.146341463,-4.776663628,-9.783086619,-5.530361686,-16.26197786,-1.49787489,-3.712035996,-6.213636107,-1.812928446,-7.896160087,-9.545586527,-4.958979034,-9.929649714,-5.751576153,-16.07591404,-1.49787489,-3.712035996,-6.326611309,-1.737389761 +050,3,5,13,089,Georgia,DeKalb County,691893,692031,692536,698496,710783,718026,725247,734846,747299,751680,755514,759932,762009,505,5960,12287,7243,7221,9599,12453,4381,3834,4418,2077,2668,11046,11008,10891,11016,11111,11129,10986,11028,10579,10514,984,4214,4148,4259,4399,4380,4514,4637,4799,4912,5495,1684,6832,6860,6632,6617,6731,6615,6349,6229,5667,5019,879,3095,4346,4896,4071,4978,7051,4723,3943,3975,3081,-2138,-3974,1075,-4277,-3337,-2026,-1194,-6660,-6310,-5207,-6022,-1259,-879,5421,619,734,2952,5857,-1937,-2367,-1232,-2941,80,7,6,-8,-130,-84,-19,-31,-28,-17,-1,13049,12828,12473,13845,13560,13318,11634,13576,12258,11522,11856,11844,15.881733849,15.622172756,15.244864779,15.265303238,15.219578479,15.017424071,14.657977196,14.633816217,13.96156643,13.816567134,6.0588110123,5.8866980917,5.9616085845,6.0958668249,5.9996178326,6.0911719164,6.1868778682,6.3681251385,6.4825800457,7.2210420772,9.8229228371,9.7354746647,9.2832561945,9.1694364129,9.2199606463,8.9262521548,8.4710993283,8.2656910789,7.4789863842,6.5955250565,4.4499335745,6.1676928415,6.8532603028,5.641344361,6.8187437376,9.5145886536,6.3016226378,5.2322395126,5.2459803913,4.0487771865,-5.713743465,1.5256028082,-5.986804394,-4.624211774,-2.775165692,-1.611178393,-8.886048437,-8.373175583,-6.871904377,-7.913578779,-1.263809891,7.6932956498,0.8664559084,1.0171325868,4.0435780461,7.9034102601,-2.584425799,-3.140936071,-1.625923985,-3.864801592 +050,3,5,13,091,Georgia,Dodge County,21796,21792,21756,21606,21511,21424,21167,21133,20866,20777,20858,20672,20452,-36,-150,-95,-87,-257,-34,-267,-89,81,-186,-220,61,251,242,278,223,240,222,205,228,206,206,24,246,240,227,198,228,234,238,212,228,295,37,5,2,51,25,12,-12,-33,16,-22,-89,0,-3,0,5,2,8,24,20,15,19,12,-75,-152,-96,-142,-288,-51,-280,-75,51,-181,-143,-75,-155,-96,-137,-286,-43,-256,-55,66,-162,-131,2,0,-1,-1,4,-3,1,-1,-1,-2,0,1951,1915,1841,1854,1883,1817,1823,1758,1664,1854,1818,1818,11.576956782,11.225270775,12.949807849,10.471695898,11.34751773,10.571680278,9.8455922964,10.952323766,9.9205393691,10.018480693,11.346340113,11.132499942,10.574123675,9.2977389589,10.780141844,11.143122455,11.43049252,10.183739642,10.980014447,14.346853419,0.230616669,0.0927708329,2.3756841738,1.1739569393,0.5673758865,-0.571442177,-1.584900223,0.7685841239,-1.059475078,-4.328372726,-0.138370001,0,0.2329102131,0.0939165551,0.378250591,1.1428843544,0.9605455899,0.7205476162,0.9150012039,0.583600817,-7.010746737,-4.452999977,-6.614650052,-13.52398394,-2.411347518,-13.3336508,-3.602045962,2.449861895,-8.716590417,-6.954576403,-7.149116738,-4.452999977,-6.381739839,-13.43006739,-2.033096927,-12.19076645,-2.641500372,3.1704095112,-7.801589213,-6.370975586 +050,3,5,13,093,Georgia,Dooly County,14918,14920,14850,14610,14414,14373,14248,14033,13870,13694,13718,13400,13174,-70,-240,-196,-41,-125,-215,-163,-176,24,-318,-226,32,135,122,110,107,100,123,92,90,110,110,46,115,130,123,110,130,139,114,112,130,133,-14,20,-8,-13,-3,-30,-16,-22,-22,-20,-23,4,17,26,6,-4,-2,1,-1,-1,-1,1,-63,-279,-220,-33,-119,-184,-148,-156,47,-295,-203,-59,-262,-194,-27,-123,-186,-147,-157,46,-296,-202,3,2,6,-1,1,1,0,3,0,-2,-1,1978,1974,1948,1932,1900,1869,1867,1875,1815,1938,1879,1876,9.1649694501,8.4068357222,7.6423385556,7.4770273575,7.0718857183,8.8162563165,6.6753736758,6.5664672406,8.1126926765,8.2787687213,7.8071961982,8.9581036384,8.5455240213,7.6866636386,9.1934514338,9.9630864065,8.2716586852,8.1716036772,9.5877277085,10.009783999,1.3577732519,-0.551267916,-0.903185466,-0.209636281,-2.121565715,-1.14683009,-1.596285009,-1.605136437,-1.475035032,-1.731015278,1.1541072641,1.7916207277,0.4168548303,-0.279515041,-0.141437714,0.0716768806,-0.07255841,-0.072960747,-0.073751752,0.0752615338,-18.94093686,-15.1598677,-2.292701567,-8.315572482,-13.01226972,-10.60817833,-11.31911189,3.4291551145,-21.75676672,-15.27809137,-17.7868296,-13.36824697,-1.875846736,-8.595087523,-13.15370744,-10.53650145,-11.39167029,3.3561943674,-21.83051847,-15.20282983 +050,3,5,13,095,Georgia,Dougherty County,94565,94564,94521,95080,94716,93441,92775,91556,90365,89537,89247,87854,86477,-43,559,-364,-1275,-666,-1219,-1191,-828,-290,-1393,-1377,382,1572,1384,1404,1273,1279,1184,1248,1194,1189,1169,269,755,890,917,848,879,975,929,949,988,1046,113,817,494,487,425,400,209,319,245,201,123,16,61,106,114,74,96,90,56,55,40,29,-165,-317,-973,-1917,-1179,-1732,-1494,-1206,-584,-1631,-1522,-149,-256,-867,-1803,-1105,-1636,-1404,-1150,-529,-1591,-1493,-7,-2,9,41,14,17,4,3,-6,-3,-7,4331,4483,4645,4375,3977,4363,4124,4048,3946,4938,4563,4555,16.582191022,14.584079749,14.92370733,13.67229454,13.877210019,13.016639091,13.874220409,13.356899946,13.427366305,13.411269367,7.9640930164,9.3784905899,9.7471792174,9.1077028827,9.5371912484,10.71893844,10.32784516,10.61616252,11.157475113,12.000160614,8.6180980058,5.2055891589,5.1765281122,4.564591657,4.3400187706,2.2977006503,3.5463752487,2.7407374262,2.269891192,1.4111087529,0.6434565219,1.1169887669,1.2117540139,0.7947759591,1.0416045049,0.9894404714,0.6225611722,0.6152675855,0.4517196402,0.3327004377,-3.34386422,-10.25311387,-20.37660039,-12.66271427,-18.79228128,-16.42471183,-13.40729953,-6.533023089,-18.41886833,-17.46103676,-2.700407698,-9.136125103,-19.16484638,-11.86793831,-17.75067677,-15.43527135,-12.78473836,-5.917755504,-17.96714869,-17.12833633 +050,3,5,13,097,Georgia,Douglas County,132403,132281,132575,133128,133597,136081,138082,140264,141824,143563,145260,146680,147988,294,553,469,2484,2001,2182,1560,1739,1697,1420,1308,433,1751,1762,1744,1714,1748,1794,1669,1724,1661,1669,153,830,843,836,895,960,972,976,1002,1020,1167,280,921,919,908,819,788,822,693,722,641,502,52,101,115,157,101,129,181,112,90,93,83,-33,-472,-580,1406,1084,1271,562,942,892,688,720,19,-371,-465,1563,1185,1400,743,1054,982,781,803,-5,3,15,13,-3,-6,-5,-8,-7,-2,3,1368,1373,1380,1340,1315,1369,1278,1329,1241,1217,1256,1252,13.180129694,13.212109851,12.933943444,12.503510685,12.559907453,12.71943507,11.696398224,11.938107422,11.37905049,11.328003041,6.247577182,6.3211172556,6.1999866507,6.5289626974,6.8978896769,6.8914664927,6.839835031,6.9385055899,6.9877372063,7.920778639,6.9325525116,6.8909925954,6.7339567929,5.9745479879,5.6620177764,5.8279685772,4.8565631931,4.9996018323,4.3913132836,3.4072244017,0.7602473438,0.8623113694,1.16435156,0.7367879692,0.9269039253,1.2832874848,0.7848991019,0.623219065,0.6371172159,0.5633458672,-3.552839072,-4.349048646,10.427250276,7.9077045407,9.1325185201,3.9845721902,6.6015620894,6.1767933994,4.7132972529,4.8868557156,-2.792591728,-3.486737276,11.591601836,8.6444925099,10.059422445,5.267859675,7.3864611913,6.8000124644,5.3504144687,5.4502015828 +050,3,5,13,099,Georgia,Early County,11008,11008,10983,10791,10641,10543,10451,10459,10310,10313,10255,10176,10037,-25,-192,-150,-98,-92,8,-149,3,-58,-79,-139,40,160,155,143,118,130,139,125,122,141,124,12,121,124,170,137,135,133,136,149,136,159,28,39,31,-27,-19,-5,6,-11,-27,5,-35,0,2,1,0,3,5,6,1,1,0,4,-54,-235,-188,-72,-76,9,-162,15,-31,-84,-108,-54,-233,-187,-72,-73,14,-156,16,-30,-84,-104,1,2,6,1,0,-1,1,-2,-1,0,0,172,153,133,113,131,132,129,107,125,134,137,137,14.696426931,14.46435237,13.500755287,11.24130704,12.434241989,13.385333911,12.122387625,11.863088292,13.802554941,12.269331618,11.114172867,11.571481896,16.049848943,13.051348004,12.912482066,12.807549714,13.189157737,14.488525865,13.313102638,15.732449414,3.5822540645,2.8928704741,-2.549093656,-1.810040964,-0.478240077,0.5777841976,-1.066770111,-2.625437573,0.4894523029,-3.463117795,0.1837053366,0.0933184024,0,0.2857959417,0.4782400765,0.5777841976,0.096979101,0.0972384286,0,0.3957848909,-21.58537706,-17.54385965,-6.797583082,-7.240163856,0.8608321377,-15.60017334,1.4546865151,-3.014391287,-8.222798688,-10.68619205,-21.40167172,-17.45054125,-6.797583082,-6.954367915,1.3390722143,-15.02238914,1.5516656161,-2.917152859,-8.222798688,-10.29040716 +050,3,5,13,101,Georgia,Echols County,4034,4023,4014,4063,3965,3992,4027,4024,3934,3888,3933,3963,4002,-9,49,-98,27,35,-3,-90,-46,45,30,39,13,64,78,76,72,58,50,50,40,65,36,10,32,23,33,30,29,33,29,23,15,24,3,32,55,43,42,29,17,21,17,50,12,-3,2,3,1,5,7,-1,-3,-3,-3,-2,-9,15,-160,-16,-11,-40,-106,-65,31,-17,30,-12,17,-157,-15,-6,-33,-107,-68,28,-20,28,0,0,4,-1,-1,1,0,1,0,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,15.847468119,19.431988042,19.102676888,17.957351291,14.408148056,12.56597135,12.784454104,10.228870988,16.464032421,9.0395480226,7.9237340597,5.7299451918,8.2945833857,7.4822297045,7.2040740281,8.2935410907,7.4149833802,5.8816008183,3.7993920973,6.0263653484,7.9237340597,13.70204285,10.808093503,10.475121586,7.2040740281,4.2724302589,5.3694707236,4.3472701701,12.664640324,3.0131826742,0.4952333787,0.7473841555,0.2513510117,1.2470382841,1.7389144206,-0.251319427,-0.767067246,-0.767165324,-0.759878419,-0.502197112,3.7142503405,-39.86048829,-4.021616187,-2.743484225,-9.936653832,-26.63985926,-16.61979033,7.927375016,-4.30597771,7.5329566855,4.2094837192,-39.11310414,-3.770265175,-1.496445941,-8.197739411,-26.89117869,-17.38685758,7.1602096919,-5.06585613,7.0307595731 +050,3,5,13,103,Georgia,Effingham County,52250,52258,52469,52709,53360,54456,55452,57125,58705,60121,62274,64342,65765,211,240,651,1096,996,1673,1580,1416,2153,2068,1423,141,661,700,739,778,757,763,762,815,809,806,53,326,349,397,403,423,427,453,513,498,525,88,335,351,342,375,334,336,309,302,311,281,4,21,25,26,35,62,70,45,38,24,23,119,-116,283,716,580,1262,1170,1061,1808,1736,1124,123,-95,308,742,615,1324,1240,1106,1846,1760,1147,0,0,-8,12,6,15,4,1,5,-3,-5,607,615,631,564,511,487,550,590,577,606,606,607,12.569168457,13.198955397,13.708540476,14.157295192,13.448572977,13.174479841,12.825475906,13.317537481,12.778795729,12.38980224,6.1990150031,6.5806220479,7.364398605,7.3334061215,7.5148564982,7.3728740395,7.6245939441,8.3826953715,7.8663044165,8.0702806152,6.3701534541,6.618333349,6.3441418713,6.8238890709,5.9337164785,5.8016058016,5.2008819619,4.9348421096,4.9124913123,4.3195216245,0.3993230523,0.4713912642,0.4823031832,0.6368963133,1.1014683283,1.2086678753,0.7574099944,0.6209403979,0.379099008,0.3535551508,-2.20578448,5.3361491105,13.28188766,10.554281763,22.420210167,20.202020202,17.858044536,29.54369051,27.421494914,17.278086498,-1.806461427,5.8075403747,13.764190844,11.191178076,23.521678496,21.410688077,18.61545453,30.164630908,27.800593922,17.631641649 +050,3,5,13,105,Georgia,Elbert County,20166,20165,20101,19822,19577,19492,19391,19303,19122,19104,19053,19205,19335,-64,-279,-245,-85,-101,-88,-181,-18,-51,152,130,57,251,229,241,222,218,207,241,187,223,214,65,262,223,265,270,235,262,258,272,257,282,-8,-11,6,-24,-48,-17,-55,-17,-85,-34,-68,0,-5,-5,5,4,0,2,0,-2,-3,-1,-59,-264,-252,-63,-53,-69,-127,1,38,190,200,-59,-269,-257,-58,-49,-69,-125,1,36,187,199,3,1,6,-3,-4,-2,-1,-2,-2,-1,-1,220,222,223,229,231,268,265,274,264,285,275,275,12.574205345,11.624660524,12.337147099,11.418872001,11.267896832,10.774235524,12.609218856,9.8016091412,11.657692509,11.105345096,13.125266137,11.320084266,13.56574266,13.887817298,12.146586034,13.636955107,13.49866583,14.256886024,13.435098541,14.634146341,-0.551060792,0.3045762583,-1.228595562,-2.468945297,-0.878689202,-2.862719584,-0.889446973,-4.455276882,-1.777406033,-3.528801245,-0.250482178,-0.253813549,0.2559574087,0.2057454415,0,0.1040988939,0,-0.104830044,-0.156829944,-0.051894136,-13.22545901,-12.79220285,-3.225063349,-2.726127099,-3.56644441,-6.610279766,0.0523204102,1.9917708415,9.9325631241,10.378827193,-13.47594119,-13.0460164,-2.969105941,-2.520381658,-3.56644441,-6.506180872,0.0523204102,1.8869407972,9.77573318,10.326933057 +050,3,5,13,107,Georgia,Emanuel County,22598,22592,22602,22489,22727,22626,22476,22465,22405,22528,22582,22600,22507,10,-113,238,-101,-150,-11,-60,123,54,18,-93,85,334,319,303,338,319,299,313,280,301,288,86,279,254,286,286,277,272,305,326,296,303,-1,55,65,17,52,42,27,8,-46,5,-15,-2,-2,-5,-6,0,2,2,-3,-4,-4,-4,14,-165,172,-115,-203,-52,-87,118,103,17,-76,12,-167,167,-121,-203,-50,-85,115,99,13,-80,-1,-1,6,3,1,-3,-2,0,1,0,2,916,916,936,1229,1084,937,945,1033,1182,1312,1365,1368,14.814486261,14.11004954,13.361850374,14.988248858,14.196390824,13.327390238,13.931854094,12.414098869,13.323890045,12.769636642,12.37497505,11.234961076,12.6121756,12.682364418,12.327273536,12.123913528,13.575768366,14.453557969,13.102562968,13.434721884,2.4395112107,2.8750884643,0.7496747734,2.3058844397,1.8691172871,1.2034767105,0.3560857276,-2.0394591,0.2213270772,-0.665085242,-0.088709499,-0.221160651,-0.264591097,0,0.0890055851,0.089146423,-0.133532148,-0.17734427,-0.177061662,-0.177356064,-7.318533632,7.6079263977,-5.07132935,-9.001818101,-2.314145213,-3.8778694,5.2522644827,4.5666149413,0.7525120623,-3.369765225,-7.407243131,7.3867657466,-5.335920446,-9.001818101,-2.225139628,-3.788722977,5.1187323348,4.3892706717,0.5754504006,-3.547121289 +050,3,5,13,109,Georgia,Evans County,11000,11008,11028,10983,10678,10792,10808,10690,10633,10747,10677,10661,10638,20,-45,-305,114,16,-118,-57,114,-70,-16,-23,48,148,177,168,162,161,131,143,130,125,130,5,105,109,123,114,133,117,106,132,90,125,43,43,68,45,48,28,14,37,-2,35,5,0,-9,-11,-5,-3,-1,-1,6,4,5,7,-23,-80,-379,72,-28,-145,-71,72,-72,-55,-36,-23,-89,-390,67,-31,-146,-72,78,-68,-50,-29,0,1,17,2,-1,0,1,-1,0,-1,1,404,403,397,403,401,392,387,394,401,403,404,404,13.447821544,16.342735792,15.649743829,15,14.978137501,12.287201613,13.376987839,12.13592233,11.716187084,12.207145875,9.5406842034,10.064170629,11.45784816,10.555555556,12.373244023,10.974065563,9.9158091674,12.322628827,8.4356547005,11.737640265,3.9071373404,6.2785651632,4.1918956684,4.4444444444,2.6048934785,1.3131360503,3.4611786717,-0.186706497,3.2805323835,0.4695056106,-0.817772932,-1.015650247,-0.465766185,-0.277777778,-0.09303191,-0.093795432,0.561272217,0.3734129948,0.4686474834,0.6573078548,-7.269092726,-34.9937676,6.7070330694,-2.592592593,-13.48962694,-6.659475684,6.7352666043,-6.721433906,-5.155122317,-3.380440396,-8.086865658,-36.00941785,6.241266884,-2.87037037,-13.58265885,-6.753271116,7.2965388213,-6.348020911,-4.686474834,-2.723132541 +050,3,5,13,111,Georgia,Fannin County,23682,23706,23684,23647,23617,23835,23869,24455,25051,25348,25995,26068,26521,-22,-37,-30,218,34,586,596,297,647,73,453,49,197,184,198,201,226,201,191,216,198,199,56,265,292,341,314,320,329,350,352,346,390,-7,-68,-108,-143,-113,-94,-128,-159,-136,-148,-191,0,-5,-5,-12,1,2,-1,-3,-4,-4,-5,-10,37,86,365,146,670,722,457,785,228,653,-10,32,81,353,147,672,721,454,781,224,648,-5,-1,-3,8,0,8,3,2,2,-3,-4,161,160,159,161,157,157,154,160,159,163,160,160,8.3243540175,7.7860528097,8.3452752255,8.4269662921,9.3535303369,8.1202278512,7.5795154666,8.413999961,7.6061694486,7.5681226112,11.1977351,12.356127285,14.372418444,13.164514506,13.24393676,13.291318224,13.889164468,13.71170364,13.291589036,14.831999087,-2.873381082,-4.570074475,-6.027143218,-4.737548214,-3.890406423,-5.171090373,-6.309649001,-5.297703679,-5.685419588,-7.263876476,-0.211278021,-0.211577522,-0.505774256,0.0419252054,0.0827746048,-0.040399144,-0.119049981,-0.155814814,-0.153659989,-0.190153834,1.5634573535,3.6391333785,15.383966956,6.1210799933,27.729492592,29.168181635,18.135280462,30.578657266,8.758619365,24.834090779,1.3521793328,3.4275558565,14.8781927,6.1630051987,27.812267196,29.127782491,18.016230481,30.422842452,8.6049593761,24.643936945 +050,3,5,13,113,Georgia,Fayette County,106567,106556,106938,107171,107343,108103,109259,110215,111294,112626,113333,114645,115821,382,233,172,760,1156,956,1079,1332,707,1312,1176,197,780,809,816,827,925,865,899,826,859,868,227,765,669,818,797,835,892,813,909,914,990,-30,15,140,-2,30,90,-27,86,-83,-55,-122,48,121,192,213,178,222,331,201,162,165,119,367,93,-200,549,959,648,783,1059,637,1219,1192,415,214,-8,762,1137,870,1114,1260,799,1384,1311,-3,4,40,0,-11,-4,-8,-14,-9,-17,-13,557,558,571,549,546,500,547,505,524,457,493,491,7.2860085284,7.5426312502,7.5749839867,7.6094257506,8.4292444663,7.8100664081,8.0296534477,7.3110608562,7.5358148593,7.5325644564,7.1458929797,6.2373551377,7.5935501239,7.3333885408,7.6091017615,8.0538488278,7.2615219721,8.0457074071,8.018317557,8.5912889537,0.1401155486,1.3052761125,-0.018566137,0.2760372098,0.8201427048,-0.24378242,0.7681314755,-0.734646551,-0.482502698,-1.058724497,1.1302654256,1.7900929543,1.9772936142,1.6378207782,2.0230186719,2.9885918857,1.79528403,1.4338884488,1.4475080929,1.0326902884,0.8687164015,-1.864680161,5.0964046675,8.8239894738,5.9050274748,7.0696901706,9.4587352626,5.6381909993,10.694014335,10.344259023,1.998981827,-0.074587206,7.0736982817,10.461810252,7.9280461467,10.058282056,11.254019293,7.072079448,12.141522428,11.376949311 +050,3,5,13,115,Georgia,Floyd County,96317,96318,96436,96174,95944,95901,95894,96209,96730,97459,97907,98325,98604,118,-262,-230,-43,-7,315,521,729,448,418,279,325,1302,1128,1187,1137,1168,1283,1165,1155,1106,1088,202,984,1012,1040,1025,1046,1114,1079,1119,1218,1252,123,318,116,147,112,122,169,86,36,-112,-164,17,50,99,106,118,178,260,171,153,139,119,-13,-629,-440,-289,-219,23,97,475,265,390,320,4,-579,-341,-183,-101,201,357,646,418,529,439,-9,-1,-5,-7,-18,-8,-5,-3,-6,1,4,3733,3871,3977,3732,3985,3847,3818,3836,4024,3761,3725,3725,13.519547272,11.742783081,12.374573223,11.856409187,12.160143256,13.299540269,11.998619901,11.823961181,11.272371479,11.049667647,10.21753803,10.535191913,10.842086059,10.688495529,10.889991307,11.547691239,11.11288487,11.455422131,12.413877451,12.715242549,3.3020092415,1.2075911679,1.5324871641,1.1679136578,1.2701519497,1.75184903,0.8857350313,0.3685390498,-1.141505973,-1.665574903,0.519183843,1.0306166002,1.1050587714,1.2304804609,1.8531725168,2.6951523539,1.7611708181,1.5662909616,1.416690448,1.2085573989,-6.531332745,-4.580518223,-3.012848914,-2.283688313,0.2394548758,1.0054991474,4.8921411614,2.7128568942,3.9748868686,3.249902249,-6.012148902,-3.549901623,-1.907790143,-1.053207852,2.0926273926,3.7006515013,6.6533119796,4.2791478558,5.3915773166,4.4584596479 +050,3,5,13,117,Georgia,Forsyth County,175511,175498,176736,181828,186848,193875,202697,211368,220856,229367,237330,244624,250847,1238,5092,5020,7027,8822,8671,9488,8511,7963,7294,6223,600,2227,2191,2097,2302,2351,2437,2463,2374,2470,2366,223,826,908,946,972,1130,1162,1138,1195,1263,1522,377,1401,1283,1151,1330,1221,1275,1325,1179,1207,844,90,170,222,311,367,624,1137,651,520,498,410,725,3503,3436,5446,6931,6739,7046,6515,6255,5606,4994,815,3673,3658,5757,7298,7363,8183,7166,6775,6104,5404,46,18,79,119,194,87,30,20,9,-17,-25,642,639,620,596,614,603,584,696,669,665,651,652,12.421771288,11.885775044,11.015882939,11.609493358,11.355705022,11.276560302,10.941244672,10.173624429,10.249940866,9.550508506,4.6072667641,4.925734249,4.9694922555,4.9020102277,5.4580802531,5.3768416377,5.0552726094,5.1210957002,5.2411640945,6.1436491742,7.8145045236,6.9600407946,6.046390683,6.7074831304,5.8976247691,5.8997186644,5.8859720627,5.0525287285,5.0087767712,3.4068593318,0.9482268159,1.204309475,1.6337337119,1.8508618864,3.014019538,5.2611608795,2.8919002361,2.2284265808,2.0665872677,1.6549909076,19.539050211,18.639672775,28.608726029,34.954560584,32.550444978,32.60346487,28.941213576,26.805400506,23.263630969,20.158596568,20.487277027,19.84398225,30.242459741,36.805422471,35.564464516,37.86462575,31.833113812,29.033827087,25.330218237,21.813587475 +050,3,5,13,119,Georgia,Franklin County,22084,22098,22082,21982,21927,22056,22187,22281,22333,22876,23039,23322,23504,-16,-100,-55,129,131,94,52,543,163,283,182,77,272,274,262,246,278,271,286,262,271,280,90,252,250,290,284,305,276,293,318,310,308,-13,20,24,-28,-38,-27,-5,-7,-56,-39,-28,-1,1,2,25,18,26,52,31,26,27,23,0,-121,-78,130,152,97,6,516,192,296,188,-1,-120,-76,155,170,123,58,547,218,323,211,-2,0,-3,2,-1,-2,-1,3,1,-1,-1,610,628,653,673,742,797,810,773,822,819,816,816,12.345679012,12.480357102,11.913693927,11.120403228,12.503373212,12.148652889,12.652347984,11.412392464,11.690860853,11.959167984,11.437908497,11.387187137,13.186913126,12.838189092,13.717729603,12.372797776,12.962020837,13.851682457,13.373309463,13.155084782,0.9077705156,1.0931699652,-1.273219198,-1.717785864,-1.214356391,-0.224144887,-0.309672853,-2.439289992,-1.68244861,-1.195916798,0.0453885258,0.0910974971,1.1368028556,0.813688041,1.1693802285,2.3311068275,1.3714083479,1.1325274965,1.1647721145,0.9823602272,-5.492011619,-3.552802387,5.9113748494,6.8711434577,4.3626877755,0.2689738647,22.827313146,8.3632799739,12.769353551,8.0297270747,-5.446623094,-3.46170489,7.048177705,7.6848314988,5.532068004,2.6000806922,24.198721494,9.4958074703,13.934125666,9.0120873019 +050,3,5,13,121,Georgia,Fulton County,920581,920393,925622,947582,973464,981844,992321,1005752,1023816,1039996,1051516,1065019,1077402,5229,21960,25882,8380,10477,13431,18064,16180,11520,13503,12383,3158,13032,12685,12442,12492,12793,12464,12208,12139,11602,12264,1350,5608,5483,5939,6035,6372,6268,6363,6444,6831,8114,1808,7424,7202,6503,6457,6421,6196,5845,5695,4771,4150,709,2488,3499,4076,3000,4270,6382,4008,3185,3149,2455,2532,11955,14576,-2195,1190,2793,5461,6266,2614,5527,5728,3241,14443,18075,1881,4190,7063,11843,10274,5799,8676,8183,180,93,605,-4,-170,-53,25,61,26,56,50,31392,31771,31785,33673,34728,33551,33629,32553,33554,34299,34096,34052,13.914127879,13.206346959,12.726383772,12.655477126,12.805337943,12.282416751,11.830534952,11.607870287,10.963201648,11.448730198,5.987601991,5.7083484727,6.0747462804,6.1139773018,6.378145343,6.1766839051,6.1662593298,6.1620492734,6.4548897136,7.574608352,7.9265258883,7.4979984862,6.6516374914,6.541499824,6.4271926001,6.1057328456,5.664275622,5.4458210137,4.5083119344,3.8741218463,2.6564111544,3.6428070957,4.1691641419,3.0392596364,4.2741181128,6.2890230827,3.8840747122,3.0456435344,2.9756181684,2.291799791,12.764226427,15.175066084,-2.245170582,1.2055729891,2.7956936508,5.3814407795,6.0722585197,2.4996270641,5.2226870805,5.3472216712,15.420637581,18.81787318,1.9239935601,4.2448326254,7.0698117636,11.670463862,9.9563332319,5.5452705985,8.1983052489,7.6390214622 +050,3,5,13,123,Georgia,Gilmer County,28292,28299,28343,28329,28291,28721,28999,29512,29897,30470,31011,31575,31978,44,-14,-38,430,278,513,385,573,541,564,403,90,318,298,310,289,341,318,319,339,334,326,46,188,217,296,225,330,327,326,378,388,411,44,130,81,14,64,11,-9,-7,-39,-54,-85,7,18,56,71,38,19,36,17,16,11,8,-5,-163,-173,338,177,478,356,558,564,608,482,2,-145,-117,409,215,497,392,575,580,619,490,-2,1,-2,7,-1,5,2,5,0,-1,-2,282,254,188,187,306,186,194,187,185,175,171,171,11.222473179,10.526315789,10.874903529,10.013860014,11.655927945,10.705448669,10.568688191,11.027797206,10.673313521,10.259153777,6.6346696781,7.6651359943,10.383778854,7.7962577963,11.27993027,11.008433066,10.800602978,12.29648184,12.39893906,12.93408651,4.5878035008,2.8611797951,0.4911246755,2.2176022176,0.3759976757,-0.302984396,-0.231914788,-1.268684634,-1.725625539,-2.674932733,0.6352343309,1.9780996114,2.4907037115,1.3167013167,0.6494505307,1.2119375852,0.5632216277,0.5204860038,0.3515163136,0.2517583749,-5.752399774,-6.110914871,11.85715288,6.1330561331,16.338808087,11.98471612,18.486921662,18.347131634,19.429265331,15.168442088,-5.117165443,-4.13281526,14.347856592,7.4497574498,16.988258618,13.196653706,19.05014329,18.867617638,19.780781644,15.420200463 +050,3,5,13,125,Georgia,Glascock County,3082,3086,3079,3103,3107,3060,3008,3020,2976,3031,2968,2959,2984,-7,24,4,-47,-52,12,-44,55,-63,-9,25,10,31,25,27,35,21,26,27,30,24,26,13,32,49,38,41,43,40,44,40,28,31,-3,-1,-24,-11,-6,-22,-14,-17,-10,-4,-5,0,5,2,1,1,0,0,0,0,0,0,-5,20,27,-38,-47,34,-31,73,-54,-4,31,-5,25,29,-37,-46,34,-31,73,-54,-4,31,1,0,-1,1,0,0,1,-1,1,-1,-1,89,89,89,88,85,85,84,84,84,86,85,85,10.029116791,8.0515297907,8.7562834441,11.53592617,6.9674850697,8.6724482989,8.9895122357,10.001666944,8.098532141,8.7497896685,10.352636687,15.78099839,12.323658181,13.513513514,14.266755143,13.342228152,14.649575495,13.335555926,9.4482874979,10.432441528,-0.323519896,-7.729468599,-3.567374737,-1.977587343,-7.299270073,-4.669779853,-5.66006326,-3.333888981,-1.349755357,-1.682651859,1.6175994824,0.6441223833,0.3243067942,0.3295978906,0,0,0,0,0,0,6.4703979295,8.6956521739,-12.32365818,-15.49110086,11.280690113,-10.34022682,24.304977526,-18.0030005,-1.349755357,10.432441528,8.0879974118,9.3397745572,-11.99935139,-15.16150297,11.280690113,-10.34022682,24.304977526,-18.0030005,-1.349755357,10.432441528 +050,3,5,13,127,Georgia,Glynn County,79626,79630,79750,80123,80889,81533,82212,83368,84211,84836,85099,85326,85568,120,373,766,644,679,1156,843,625,263,227,242,261,1020,975,1008,985,979,962,932,921,921,898,217,772,731,836,810,848,863,874,957,904,1007,44,248,244,172,175,131,99,58,-36,17,-109,8,49,121,147,115,71,113,72,61,46,51,71,81,399,336,395,946,632,497,241,164,298,79,130,520,483,510,1017,745,569,302,210,349,-3,-5,2,-11,-6,8,-1,-2,-3,0,2,1453,1464,1478,1443,1224,1246,1302,1310,1445,1609,1534,1531,12.760128352,12.110898567,12.41211166,12.030901707,11.82509965,11.481152173,11.026519252,10.839438609,10.808273434,10.509438599,9.6576657722,9.0800685663,10.294171972,9.8934318605,10.242782945,10.299619881,10.340319556,11.26313002,10.608772187,11.785083151,3.1024625797,3.0308300002,2.117939688,2.1374698464,1.5823167049,1.1815322922,0.6861996959,-0.423691411,0.1995012469,-1.275644552,0.6129865581,1.5029935657,1.810099617,1.4046230419,0.8575914966,1.3486176669,0.8518341053,0.7179215582,0.5398269033,0.5968612122,1.0133043103,4.9561523365,4.1373705533,4.8245747962,11.426500785,7.5427111989,5.8800215325,2.8363786154,1.924600264,3.4875419851,1.6262908684,6.4591459022,5.9474701703,6.2291978381,12.284092282,8.8913288658,6.7318556378,3.5543001736,2.4644271674,4.0844031973 +050,3,5,13,129,Georgia,Gordon County,55186,55221,55256,55522,55691,55767,55848,56330,57015,57204,57737,58046,58780,35,266,169,76,81,482,685,189,533,309,734,182,728,725,685,648,704,744,653,667,670,684,79,499,477,447,509,515,506,549,528,633,641,103,229,248,238,139,189,238,104,139,37,43,24,22,19,48,24,33,97,54,37,37,39,-94,18,-88,-207,-77,262,353,32,359,236,652,-70,40,-69,-159,-53,295,450,86,396,273,691,2,-3,-10,-3,-5,-2,-3,-1,-2,-1,0,670,671,671,670,671,671,671,670,743,669,669,669,13.143403925,13.038044114,12.291625545,11.611342561,12.551480682,13.128060347,11.434174699,11.605954359,11.57337433,11.709722151,9.009009009,8.5781338513,8.0209585674,9.1206379071,9.1818360106,8.9284926552,9.6131116539,9.1873221914,10.934247687,10.973584647,4.134394916,4.4599102623,4.2706669777,2.4907046544,3.3696446719,4.1995676916,1.8210630456,2.4186321678,0.6391266421,0.7361375036,0.397190778,0.3416866733,0.8613109871,0.4300497245,0.588350657,1.7115885129,0.945551966,0.6438085627,0.6391266421,0.6676595963,0.3249742729,-1.582548803,-3.714403632,-1.379742866,4.6711476404,6.2287705677,0.5603270909,6.2466830809,4.0765915549,11.161898892,0.7221650508,-1.240862129,-2.853092645,-0.949693142,5.2594982973,7.9403590807,1.5058790569,6.8904916435,4.715718197,11.829558489 +050,3,5,13,131,Georgia,Grady County,25011,25019,25027,25103,25283,25120,25236,25106,24895,24762,24730,24588,24491,8,76,180,-163,116,-130,-211,-133,-32,-142,-97,93,383,375,324,354,316,361,318,319,302,289,75,191,249,264,259,259,251,277,267,272,285,18,192,126,60,95,57,110,41,52,30,4,-1,-12,-16,5,17,52,43,7,3,2,0,-7,-105,72,-230,6,-240,-364,-182,-85,-173,-103,-8,-117,56,-225,23,-188,-321,-175,-82,-171,-103,-2,1,-2,2,-2,1,0,1,-2,-1,2,200,200,201,197,172,178,191,168,172,246,200,200,15.280271295,14.885087127,12.856377597,14.059893558,12.554129752,14.439711206,12.807861933,12.890972278,12.247049759,11.77693107,7.6201875125,9.8836978526,10.475566931,10.286758281,10.289619006,10.039799204,11.156533822,10.789622565,11.030455412,11.613928564,7.6600837822,5.0013892748,2.380810666,3.7731352768,2.2645107465,4.3999120018,1.6513281108,2.1013497131,1.2165943469,0.1630025062,-0.478755236,-0.635097051,0.1984008888,0.6751926285,2.0658694529,1.7199656007,0.2819340677,0.1212317142,0.0811062898,0,-4.189108318,2.8579367285,-9.126440886,0.2383032806,-9.534782091,-14.55970881,-7.33028576,-3.434898569,-7.015694067,-4.197314534,-4.667863555,2.2228396777,-8.928039998,0.9134959091,-7.468912638,-12.83974321,-7.048351693,-3.313666855,-6.934587777,-4.197314534 +050,3,5,13,133,Georgia,Greene County,15994,15996,15977,16049,16116,16241,16418,16620,16892,17225,17730,18356,18837,-19,72,67,125,177,202,272,333,505,626,481,42,165,183,156,169,163,173,159,167,179,178,78,169,184,189,195,200,175,216,225,191,252,-36,-4,-1,-33,-26,-37,-2,-57,-58,-12,-74,-4,9,17,25,20,21,60,44,39,39,29,20,68,52,131,179,217,214,346,521,601,529,16,77,69,156,199,238,274,390,560,640,558,1,-1,-1,2,4,1,0,0,3,-2,-3,168,171,177,161,154,167,167,158,164,200,177,177,10.304127896,11.378827919,9.6424266774,10.349367709,9.8674253889,10.324659823,9.3208664302,9.5551423258,9.9207448872,9.5716935983,10.553924936,11.441007306,11.682170782,11.941578125,12.107270416,10.444020053,12.662309113,12.87369475,10.585822757,13.550937004,-0.24979704,-0.062179388,-2.039744105,-1.592210417,-2.239845027,-0.119360229,-3.341442683,-3.318552425,-0.66507787,-3.979243406,0.5620433398,1.0570495881,1.5452606855,1.2247772436,1.2712633937,3.5808068751,2.5793592637,2.2314404234,2.161503076,1.5594332267,4.2465496784,3.2333281517,8.0971659919,10.961756331,13.136388401,12.771544521,20.283143301,29.8097554,33.309316632,28.446212997,4.8085930182,4.2903777398,9.6424266774,12.186533574,14.407651795,16.352351397,22.862502565,32.041195823,35.470819708,30.005646224 +050,3,5,13,135,Georgia,Gwinnett County,805321,805241,807979,822407,836854,853496,871052,888597,905291,918681,928072,937399,942627,2738,14428,14447,16642,17556,17545,16694,13390,9391,9327,5228,2901,11717,11459,11148,11622,11759,11918,11899,11465,11446,11123,910,3476,3426,3788,3772,4076,4245,4271,4360,4748,5160,1991,8241,8033,7360,7850,7683,7673,7628,7105,6698,5963,616,1956,2877,3027,2284,3710,5621,3701,3254,2665,2175,170,4231,3678,6268,7451,6198,3446,2108,-972,-54,-2942,786,6187,6555,9295,9735,9908,9067,5809,2282,2611,-767,-39,0,-141,-13,-29,-46,-46,-47,4,18,32,5682,5645,5582,5568,5248,5246,5181,4797,5046,5485,4955,4945,14.373283382,13.81217301,13.190167717,13.478314318,13.365165439,13.287340124,13.047349411,12.416387032,12.271431719,11.832815078,4.2640209128,4.1295492391,4.4819120301,4.3744795738,4.632742098,4.7327369379,4.6831859261,4.7218009122,5.0904034423,5.4892857865,10.109262469,9.6826237705,8.7082556867,9.1038347439,8.7324233412,8.5546031859,8.364163485,7.6945861195,7.1810282765,6.3435292916,2.399431791,3.4678088619,3.5815067885,2.648810007,4.216750045,6.2668349418,4.0581763317,3.5240229744,2.8571872733,2.3137977879,5.1901819569,4.4332989204,7.4162155767,8.6411047996,7.0445867329,3.8419343906,2.3114389914,-1.052658368,-0.057894226,-3.12974395,7.5896137479,7.9011077823,10.997722365,11.289914807,11.261336778,10.108769332,6.369615323,2.4713646059,2.7992930472,-0.815946162 +050,3,5,13,137,Georgia,Habersham County,43041,43028,43058,43041,43373,43146,43553,43775,44166,44687,45580,45542,46047,30,-17,332,-227,407,222,391,521,893,-38,505,117,519,492,520,480,461,522,563,505,487,473,79,402,400,450,389,419,485,489,474,447,506,38,117,92,70,91,42,37,74,31,40,-33,-6,-25,-12,11,8,48,99,121,106,101,78,2,-107,243,-313,306,135,256,327,753,-180,461,-4,-132,231,-302,314,183,355,448,859,-79,539,-4,-2,9,5,2,-3,-1,-1,3,1,-1,2384,2406,2374,2629,2300,2435,2524,2497,2543,2769,2380,2380,12.055889151,11.387043766,12.02048105,11.072792074,10.557896665,11.871595729,12.672616569,11.189028106,10.688966441,10.328751269,9.3380875504,9.2577591594,10.402339371,8.9735752431,9.596005863,11.030122468,11.006944054,10.502176875,9.8110225851,11.049361823,2.7178016005,2.1292846067,1.6181416799,2.0992168306,0.9618908025,0.8414732605,1.6656725153,0.6868512302,0.8779438555,-0.720610554,-0.580726838,-0.277732775,0.2542794068,0.1845465346,1.0993037743,2.2515095348,2.7235996534,2.3485880776,2.2168082351,1.7032613087,-2.485510865,5.6240886893,-7.23540494,7.058904947,3.0917918652,5.8220852617,7.3604717905,16.683837947,-3.95074735,10.066711068,-3.066237703,5.3463559146,-6.981125533,7.2434514816,4.1910956394,8.0735947965,10.084071444,19.032426025,-1.733939115,11.769972377 +050,3,5,13,139,Georgia,Hall County,179684,179765,180070,182299,184136,186459,189156,192249,196176,198854,201396,204310,206591,305,2229,1837,2323,2697,3093,3927,2678,2542,2914,2281,633,2612,2549,2472,2431,2615,2740,2528,2610,2539,2546,220,1193,1253,1323,1373,1480,1466,1553,1566,1587,1773,413,1419,1296,1149,1058,1135,1274,975,1044,952,773,-1,-2,50,97,176,302,361,156,84,21,40,-97,815,530,1090,1449,1648,2288,1544,1415,1937,1459,-98,813,580,1187,1625,1950,2649,1700,1499,1958,1499,-10,-3,-39,-13,14,8,4,3,-1,4,9,3141,3124,3122,2973,2871,2815,2923,2895,3142,2753,2965,2962,14.416244215,13.912426488,13.34070886,12.944105001,13.712457886,14.108257707,12.799027922,13.041848844,12.516452801,12.392279406,6.584448449,6.8388663747,7.139869669,7.3106771561,7.7607792242,7.5484327734,7.8626939726,7.8251093067,7.8233992103,8.6298159411,7.8317957662,7.073560113,6.200839191,5.633427845,5.9516786618,6.559824934,4.9363339493,5.2167395378,4.6930535905,3.7624634644,-0.011038472,0.2728996957,0.5234825079,0.9371297738,1.5836184633,1.8587886979,0.7898134319,0.419737664,0.103523241,0.1946940991,4.4981772723,2.8927367746,5.8824323048,7.7153468312,8.6417325415,11.780910086,7.8171278131,7.0705808869,9.5487865597,7.1014672634,4.4871388005,3.1656364703,6.4059148127,8.652476605,10.225351005,13.639698784,8.606941245,7.4903185509,9.6523098007,7.2961613625 +050,3,5,13,141,Georgia,Hancock County,9429,9401,9433,9394,9078,8952,8571,8579,8644,8545,8344,8475,8494,32,-39,-316,-126,-381,8,65,-99,-201,131,19,25,96,90,79,62,66,72,50,56,52,53,4,89,93,87,85,105,112,101,130,88,136,21,7,-3,-8,-23,-39,-40,-51,-74,-36,-83,0,1,4,9,6,4,11,7,7,5,5,9,-46,-331,-130,-379,42,94,-55,-134,161,98,9,-45,-327,-121,-373,46,105,-48,-127,166,103,2,-1,14,3,15,1,0,0,0,1,-1,1471,1511,1583,1420,1420,1182,1248,1308,1326,1211,1302,1301,10.198119722,9.7444781291,8.7631724903,7.0764138561,7.6967930029,8.360912733,5.8176740939,6.6315353188,6.1834829657,6.2466851317,9.4545068253,10.069294067,9.6505823627,9.7015351253,12.244897959,13.005864251,11.75170167,15.394635562,10.464355788,16.029229772,0.7436128964,-0.324815938,-0.887409872,-2.625121269,-4.548104956,-4.644951518,-5.934027576,-8.763100243,-4.280872822,-9.78254464,0.1062304138,0.4330879168,0.9983361065,0.6848142441,0.4664723032,1.2773616675,0.8144743731,0.8289419149,0.5945656698,0.5893099181,-4.886599033,-35.83802512,-14.42041043,-43.25743309,4.8979591837,10.915636068,-6.399441503,-15.86831666,19.145014567,11.550474394,-4.78036862,-35.4049372,-13.42207432,-42.57261884,5.3644314869,12.192997736,-5.58496713,-15.03937474,19.739580237,12.139784313 +050,3,5,13,143,Georgia,Haralson County,28780,28780,28763,28474,28325,28357,28513,28733,28860,29286,29626,29884,30383,-17,-289,-149,32,156,220,127,426,340,258,499,87,376,337,338,330,354,335,332,364,361,360,101,385,327,315,318,358,391,343,398,333,361,-14,-9,10,23,12,-4,-56,-11,-34,28,-1,0,0,2,-1,1,-2,6,1,1,-6,0,-1,-280,-163,13,144,225,178,436,373,236,504,-1,-280,-161,12,145,223,184,437,374,230,504,-2,0,2,-3,-1,1,-1,0,0,0,-4,354,352,345,350,345,333,335,319,342,342,350,350,13.138354561,11.866406099,11.926184679,11.605415861,12.367676344,11.633358221,11.419530148,12.357414449,12.13241472,11.946836577,13.452836452,11.514287223,11.114639568,11.183400739,12.5074241,13.578038998,11.797888075,13.511678436,11.191396404,11.980022234,-0.314481891,0.3521188753,0.8115451113,0.4220151222,-0.139747755,-1.944680777,-0.378357927,-1.154263987,0.9410183162,-0.033185657,0,0.0704237751,-0.03528457,0.0351679269,-0.069873878,0.2083586547,0.0343961751,0.0339489408,-0.201646782,0,-9.783881056,-5.739537668,0.4586994107,5.0641814665,7.8608112357,6.181306756,14.996732363,12.662954916,7.9314400941,16.725571208,-9.783881056,-5.669113893,0.4234148407,5.0993493934,7.7909373581,6.3896654107,15.031128539,12.696903857,7.729793312,16.725571208 +050,3,5,13,145,Georgia,Harris County,32024,31992,32147,32303,32564,32532,32730,33147,33615,33945,34552,35188,36080,155,156,261,-32,198,417,468,330,607,636,892,73,312,297,274,278,293,277,300,321,315,314,33,233,207,257,240,258,273,290,295,320,385,40,79,90,17,38,35,4,10,26,-5,-71,0,4,18,9,2,4,14,6,-1,4,-1,109,73,160,-59,164,380,452,314,584,642,973,109,77,178,-50,166,384,466,320,583,646,972,6,0,-7,1,-6,-2,-2,0,-2,-5,-9,442,441,440,428,410,432,443,428,448,445,454,446,9.6819239721,9.1571985755,8.4183359961,8.5195059912,8.8953656056,8.2981336689,8.8809946714,9.3726732558,9.0335531976,8.8118089465,7.2304111715,6.3822899163,7.8960304781,7.3549692011,7.8327792705,8.1783050238,8.5849615157,8.6135159204,9.1769429309,10.80428804,2.4515128006,2.7749086593,0.522305518,1.1645367902,1.0625863351,0.119828645,0.2960331557,0.7591573354,-0.143389733,-1.992479093,0.1241272304,0.5549817319,0.276514686,0.06129141,0.1214384383,0.4194002576,0.1776198934,-0.029198359,0.1147117866,-0.028063086,2.265321955,4.9331709498,-1.812707386,5.0258956207,11.536651639,13.540636889,9.2954410894,17.051841686,18.411241755,27.3053825,2.3894491854,5.4881526816,-1.5361927,5.0871870307,11.658090077,13.960037147,9.4730609828,17.022643327,18.525953542,27.277319414 +050,3,5,13,147,Georgia,Hart County,25213,25205,25237,25414,25512,25458,25367,25415,25459,25708,26078,26255,26406,32,177,98,-54,-91,48,44,249,370,177,151,71,283,249,286,292,257,273,288,278,256,246,38,285,290,275,284,283,339,293,312,280,349,33,-2,-41,11,8,-26,-66,-5,-34,-24,-103,1,2,5,11,8,5,-1,-3,-4,-4,-3,1,177,134,-76,-103,71,113,257,407,206,257,2,179,139,-65,-95,76,112,254,403,202,254,-3,0,0,0,-4,-2,-2,0,1,-1,0,663,664,663,795,665,667,664,672,666,681,664,662,11.174507907,9.7788948671,11.22228762,11.490408264,10.121696664,10.732397688,11.257255653,10.736492488,9.7835018057,9.3427773874,11.253479694,11.389074343,10.790661173,11.175602558,11.145681541,13.327043283,11.452694119,12.049588692,10.7007051,13.254590684,-0.078971787,-1.610179476,0.4316264469,0.3148057059,-1.023984877,-2.594645595,-0.195438466,-1.313096204,-0.917203294,-3.911813296,0.0789717873,0.1963633507,0.4316264469,0.3148057059,0.1969201686,-0.039312812,-0.11726308,-0.154481906,-0.152867216,-0.11393631,6.9890031786,5.2625377999,-2.982146361,-4.053123463,2.7962663936,4.4423477611,10.045537163,15.718533967,7.8726616093,9.760543856,7.0679749659,5.4589011507,-2.550519914,-3.738317757,2.9931865622,4.4030349491,9.9282740829,15.56405206,7.7197943936,9.6466075464 +050,3,5,13,149,Georgia,Heard County,11834,11828,11838,11729,11652,11564,11622,11557,11578,11748,11801,11825,11973,10,-109,-77,-88,58,-65,21,170,53,24,148,33,130,131,130,140,108,129,145,114,141,117,39,125,118,110,116,124,150,146,118,129,135,-6,5,13,20,24,-16,-21,-1,-4,12,-18,0,-1,-1,0,0,0,-2,-3,-3,-3,-1,16,-113,-92,-108,36,-47,44,173,62,14,168,16,-114,-93,-108,36,-47,42,170,59,11,167,0,0,3,0,-2,-2,0,1,-2,1,-1,132,132,132,127,132,132,125,124,132,83,130,130,11.03237578,11.205679825,11.199172984,12.076252911,9.3187799301,11.151934299,12.432478779,9.6819397851,11.936002709,9.8327590554,10.608053634,10.093665797,9.4762232943,10.006038126,10.69933992,12.967365464,12.518220012,10.021656971,10.920172691,11.345491218,0.4243221454,1.1120140285,1.7229496899,2.0702147848,-1.38055999,-1.815431165,-0.085741233,-0.339717185,1.0158300178,-1.512732162,-0.084864429,-0.085539541,0,0,0,-0.172898206,-0.257223699,-0.254787889,-0.253957504,-0.084040676,-9.589680485,-7.86963774,-9.303928325,3.1053221772,-4.05539497,3.803760536,14.833233302,5.2656163744,1.1851350207,14.118833515,-9.674544914,-7.955177281,-9.303928325,3.1053221772,-4.05539497,3.6308623298,14.576009603,5.0108284853,0.9311775163,14.03479284 +050,3,5,13,151,Georgia,Henry County,203922,203777,205042,206934,208047,210089,213059,216548,221040,225246,229873,234671,239139,1265,1892,1113,2042,2970,3489,4492,4206,4627,4798,4468,574,2446,2419,2355,2451,2358,2428,2337,2501,2492,2657,211,1168,1305,1350,1272,1418,1439,1475,1560,1688,1824,363,1278,1114,1005,1179,940,989,862,941,804,833,79,180,205,185,178,200,179,127,135,16,46,788,436,-227,878,1643,2355,3328,3221,3558,3992,3612,867,616,-22,1063,1821,2555,3507,3348,3693,4008,3658,35,-2,21,-26,-30,-6,-4,-4,-7,-14,-23,933,933,937,865,918,892,923,862,946,968,982,982,11.874478125,11.658365082,11.264277651,11.584599242,10.977474762,11.09719645,10.473104691,10.990532147,10.728800716,11.215466115,5.6702332175,6.289444577,6.4572292269,6.0120808795,6.6013821935,6.5769628052,6.6101110051,6.8553499195,7.2673417373,7.6992887444,6.2042449075,5.3689205048,4.8070484244,5.5725183624,4.3760925683,4.5202336444,3.8629936857,4.1351822271,3.4614589791,3.5161773707,0.8738373109,0.9879970408,0.8848795607,0.8413132048,0.9310835252,0.8181211551,0.5691417611,0.5932514353,0.0688847558,0.1941706591,2.1166281531,-1.094025992,4.1995905638,7.7656044694,10.963508509,15.210654771,14.434689863,15.635471162,17.186746573,15.246617843,2.990465464,-0.106028951,5.0844701246,8.6069176742,11.894592034,16.028775926,15.003831624,16.228722598,17.255631329,15.440788502 +050,3,5,13,153,Georgia,Houston County,139900,139573,140414,143557,145630,147352,148429,149197,151287,152757,155004,157427,160110,841,3143,2073,1722,1077,768,2090,1470,2247,2423,2683,500,2089,2105,2029,1999,2024,2016,2025,1970,2026,1995,253,1024,994,1000,1031,1127,1170,1207,1280,1308,1415,247,1065,1111,1029,968,897,846,818,690,718,580,79,158,460,396,288,436,234,98,35,60,54,487,1910,522,324,-163,-566,1017,562,1525,1647,2057,566,2068,982,720,125,-130,1251,660,1560,1707,2111,28,10,-20,-27,-16,1,-7,-8,-3,-2,-8,1599,1608,1692,1722,1640,1600,1529,1458,1514,1538,1542,1546,14.712769966,14.558054131,13.850680247,13.516757331,13.600962282,13.418351726,13.320440463,12.802141922,12.969263613,12.565464812,7.2120040427,6.8744445636,6.8263579333,6.971374091,7.5732630886,7.7874362695,7.9396403152,8.3181429746,8.3730487692,8.9123472225,7.5007659233,7.6836095675,7.0243223133,6.5453832396,6.0276991929,5.6309154564,5.3808001473,4.4839989472,4.5962148442,3.6531175894,1.1127896863,3.1813324942,2.7032377416,1.947386749,2.9298515587,1.5574872539,0.6446435384,0.227449222,0.3840848059,0.3401178445,13.452077853,3.6101207869,2.2117399704,-1.102166806,-3.803431152,6.7690792189,3.6968333531,9.9102875283,10.543127923,12.955970485,14.564867539,6.7914532811,4.9149777119,0.8452199431,-0.873579593,8.3265664728,4.3414768915,10.13773675,10.927212729,13.29608833 +050,3,5,13,155,Georgia,Irwin County,9538,9513,9577,9677,9598,9345,9077,9137,9307,9362,9395,9442,9387,64,100,-79,-253,-268,60,170,55,33,47,-55,25,113,101,105,93,98,101,96,102,113,105,18,103,89,103,102,117,110,113,126,98,116,7,10,12,2,-9,-19,-9,-17,-24,15,-11,0,1,1,2,0,0,0,8,7,0,2,50,90,-93,-264,-268,77,178,64,51,31,-46,50,91,-92,-262,-268,77,178,72,58,31,-44,7,-1,1,7,9,2,1,0,-1,1,0,663,734,823,792,798,671,743,981,1064,997,1146,1147,11.737820713,10.479896239,11.085889247,10.096623602,10.760953113,10.952071134,10.284428732,10.875939649,11.997664172,11.153008657,10.699075517,9.2347600519,10.874729452,11.073716209,12.847260349,11.927998265,12.105629653,13.434984273,10.405053883,12.321419088,1.0387451958,1.2451361868,0.2111597952,-0.977092607,-2.086307236,-0.975927131,-1.821200921,-2.559044623,1.5926102883,-1.168410431,0.1038745196,0.1037613489,0.2111597952,0,0,0,0.8570357277,0.7463880151,0,0.2124382601,9.3487067622,-9.649805447,-27.87309296,-29.09564651,8.4550345888,19.30166992,6.8562858214,5.4379698246,3.2913945957,-4.886079983,9.4525812818,-9.546044099,-27.66193317,-29.09564651,8.4550345888,19.30166992,7.7133215491,6.1843578397,3.2913945957,-4.673641723 +050,3,5,13,157,Georgia,Jackson County,60485,60470,60706,60985,60860,61286,62125,63439,65091,67681,70347,73015,76199,236,279,-125,426,839,1314,1652,2590,2666,2668,3184,200,802,784,702,785,797,821,838,890,879,889,91,492,532,577,507,572,594,590,651,600,683,109,310,252,125,278,225,227,248,239,279,206,2,18,-1,-4,31,40,62,42,36,30,26,123,-47,-380,309,525,1040,1360,2289,2379,2366,2972,125,-29,-381,305,556,1080,1422,2331,2415,2396,2998,2,-2,4,-4,5,9,3,11,12,-7,-20,757,753,757,733,710,657,670,670,691,606,717,716,13.180925459,12.868808732,11.494441079,12.721718485,12.694721417,12.775227573,12.623143434,12.895934158,12.262663746,11.915771979,8.0860540221,8.7324059256,9.4477101174,8.2164474804,9.1108916568,9.242978293,8.8874160215,9.4328686933,8.3704189395,9.1546369644,5.0948714367,4.1364028068,2.0467309613,4.505271005,3.5838297601,3.5322492803,3.7357274124,3.463065465,3.8922448069,2.7611350141,0.2958312447,-0.016414297,-0.065495391,0.5023863351,0.6371252907,0.96475531,0.6326635134,0.5216332918,0.418520947,0.3484927688,-0.77244825,-6.237432804,5.0595189364,8.5081556749,16.565257558,21.162374543,34.48016148,34.4712667,33.007352018,39.835404185,-0.476617005,-6.253847101,4.9940235456,9.01054201,17.202382849,22.127129853,35.112824993,34.992899991,33.425872965,40.183896953 +050,3,5,13,159,Georgia,Jasper County,13900,13894,13888,13832,13638,13594,13530,13679,13776,13881,14024,14207,14483,-6,-56,-194,-44,-64,149,97,105,143,183,276,40,197,177,172,173,155,176,143,166,147,140,46,122,132,125,137,140,132,135,176,131,134,-6,75,45,47,36,15,44,8,-10,16,6,1,4,3,6,0,2,1,1,1,1,1,1,-136,-248,-98,-102,132,52,97,152,165,272,2,-132,-245,-92,-102,134,53,98,153,166,273,-2,1,6,1,2,0,0,-1,0,1,-3,94,94,94,102,88,84,93,91,95,98,95,95,14.213564214,12.886785584,12.632197415,12.756230644,11.393288985,12.820979785,10.340962505,11.897509407,10.414083809,9.759498083,8.8023088023,9.6104841645,9.1803760282,10.101754903,10.290712632,9.6157348388,9.7624471201,12.614226841,9.2805780879,9.3412338794,5.4112554113,3.2763014197,3.4518213866,2.654475741,1.1025763534,3.2052449463,0.5785153849,-0.716717434,1.1335057207,0.4182642036,0.2886002886,0.2184200946,0.4406580494,0,0.1470101805,0.0728464761,0.0723144231,0.0716717434,0.0708441075,0.0697107006,-9.812409812,-18.05606116,-7.197414806,-7.5210146,9.70267191,3.7880167547,7.0144990418,10.894104999,11.689277744,18.961310561,-9.523809524,-17.83764106,-6.756756757,-7.5210146,9.8496820905,3.8608632307,7.0868134649,10.965776743,11.760121852,19.031021262 +050,3,5,13,161,Georgia,Jeff Davis County,15068,15074,15112,15161,15194,15041,14927,15012,14954,15033,15015,15101,15213,38,49,33,-153,-114,85,-58,79,-18,86,112,64,185,227,198,219,202,210,228,178,199,194,12,144,146,169,175,156,192,163,180,136,165,52,41,81,29,44,46,18,65,-2,63,29,-2,-7,-2,-4,-4,8,14,9,7,6,4,-10,14,-44,-178,-159,33,-89,7,-23,18,79,-12,7,-46,-182,-163,41,-75,16,-16,24,83,-2,1,-2,0,5,-2,-1,-2,0,-1,0,111,111,111,126,121,113,111,111,111,121,112,112,12.222112113,14.95634986,13.097403671,14.615589963,13.49410468,14.015884669,15.206589522,11.84771033,13.215566476,12.799366629,9.513427807,9.6195025531,11.179097073,11.679124399,10.421189752,12.814523126,10.871377597,11.980830671,9.0317439235,10.886059247,2.7086843061,5.3368473069,1.9183065983,2.9364655633,3.072914927,1.2013615431,4.3352119252,-0.133120341,4.1838225528,1.9133073827,-0.462458296,-0.131774008,-0.264594014,-0.266951415,0.5344199873,0.9343923113,0.6002601127,0.4659211928,0.3984592907,0.2639044666,0.9249165923,-2.899028167,-11.7744336,-10.61131874,2.2044824476,-5.940065407,0.4668689766,-1.530883919,1.1953778722,5.212113215,0.4624582962,-3.030802174,-12.03902762,-10.87827015,2.738902435,-5.005673096,1.0671290893,-1.064962726,1.593837163,5.4760176816 +050,3,5,13,163,Georgia,Jefferson County,16930,16916,16872,16772,16351,16245,16127,15926,15773,15638,15423,15344,15267,-44,-100,-421,-106,-118,-201,-153,-135,-215,-79,-77,50,237,220,215,184,206,221,198,183,190,188,75,199,217,224,223,226,219,204,230,247,237,-25,38,3,-9,-39,-20,2,-6,-47,-57,-49,0,-4,1,6,5,10,9,8,2,2,2,-17,-134,-441,-102,-86,-191,-164,-138,-169,-24,-31,-17,-138,-440,-96,-81,-181,-155,-130,-167,-22,-29,-2,0,16,-1,2,0,0,1,-1,0,1,527,572,636,496,591,588,623,597,529,521,600,599,14.088693378,13.28382091,13.191802675,11.367848758,12.853711041,13.943657529,12.607048486,11.783265188,12.35089544,12.283166182,11.82974676,13.102677898,13.744017671,13.777338441,14.101644152,13.817470583,12.989080259,14.809568269,16.056164072,15.484629708,2.2589466175,0.1811430124,-0.552214996,-2.409489682,-1.247933111,0.126186946,-0.382031772,-3.026303081,-3.705268632,-3.201463526,-0.237783854,0.0603810041,0.3681433305,0.3089089336,0.6239665554,0.5678412568,0.5093756964,0.1287788545,0.1300094257,0.1306719807,-7.965759125,-26.62802282,-6.258436618,-5.313233659,-11.91776121,-10.34732957,-8.786730763,-10.88181321,-1.560113108,-2.0254157,-8.203542979,-26.56764182,-5.890293288,-5.004324725,-11.29379465,-9.779488312,-8.277355067,-10.75303435,-1.430103683,-1.89474372 +050,3,5,13,165,Georgia,Jenkins County,8340,8333,8320,8124,9114,9196,9040,8906,8823,8844,8790,8734,8746,-13,-196,990,82,-156,-134,-83,21,-54,-56,12,34,104,102,100,99,103,82,102,112,92,98,40,91,131,92,109,89,103,106,105,83,111,-6,13,-29,8,-10,14,-21,-4,7,9,-13,-1,-8,-4,-6,-4,28,39,23,18,17,14,-8,-202,962,78,-145,-177,-101,3,-79,-83,10,-9,-210,958,72,-149,-149,-62,26,-61,-66,24,2,1,61,2,3,1,0,-1,0,1,1,84,84,84,1170,1192,1199,1203,1188,1194,1178,1184,1184,12.648990513,11.834319527,10.9229929,10.85764422,11.478881088,9.2503807321,11.546951944,12.702733356,10.499885871,11.212814645,11.067866699,15.198979,10.049153468,11.95437596,9.9186448234,11.619380676,11.999773589,11.908812521,9.4727231226,12.700228833,1.5811238142,-3.364659473,0.873839432,-1.096731739,1.5602362643,-2.368999944,-0.452821645,0.7939208348,1.0271627482,-1.487414188,-0.97299927,-0.464090962,-0.655379574,-0.438692696,3.1204725287,4.3995713238,2.603724458,2.0415107179,1.9401963022,1.6018306636,-24.56823157,111.61387632,8.519934462,-15.90261022,-19.7258442,-11.39376163,0.3396162337,-8.959963706,-9.472723123,1.1441647597,-25.54123084,111.14978536,7.864554888,-16.34130292,-16.60537167,-6.99419031,2.9433406917,-6.918452989,-7.53252682,2.7459954233 +050,3,5,13,167,Georgia,Johnson County,9980,9978,9991,10003,10008,9909,9813,9717,9679,9750,9767,9724,9667,13,12,5,-99,-96,-96,-38,71,17,-43,-57,35,85,89,99,59,85,106,110,107,106,105,7,86,102,112,83,86,105,104,104,110,144,28,-1,-13,-13,-24,-1,1,6,3,-4,-39,0,0,0,0,-2,-2,-2,-2,-2,-2,-2,-14,14,20,-88,-70,-93,-36,66,16,-36,-16,-14,14,20,-88,-72,-95,-38,64,14,-38,-18,-1,-1,-2,2,0,0,-1,1,0,-1,0,1737,1738,1740,1743,1737,1730,1717,1722,1720,1686,1694,1692,8.5025507652,8.8951076908,9.9412562133,5.9831660075,8.7045570917,10.930088678,11.323279634,10.964799918,10.87681494,10.829766386,8.6025807742,10.194393084,11.246673696,8.4169962478,8.8069636457,10.826974634,10.705646199,10.657375621,11.287260787,14.852251044,-0.100030009,-1.299285393,-1.305417483,-2.43383024,-0.102406554,0.1031140441,0.6176334346,0.3074242968,-0.410445847,-4.022484658,0,0,0,-0.202819187,-0.204813108,-0.206228088,-0.205877812,-0.204949531,-0.205222923,-0.206281265,1.400420126,1.9989006047,-8.83667219,-7.098671534,-9.523809524,-3.712105589,6.7939677801,1.6395962494,-3.694012621,-1.650250116,1.400420126,1.9989006047,-8.83667219,-7.301490721,-9.728622632,-3.918333677,6.5880899686,1.4346467182,-3.899235545,-1.856531381 +050,3,5,13,169,Georgia,Jones County,28669,28648,28628,28724,28610,28563,28641,28432,28572,28459,28603,28689,28787,-20,96,-114,-47,78,-209,140,-113,144,86,98,83,326,317,310,290,308,312,272,257,293,231,76,234,262,254,215,271,258,261,284,293,322,7,92,55,56,75,37,54,11,-27,0,-91,1,8,9,0,-1,0,1,0,0,0,0,-29,-4,-183,-103,8,-248,87,-124,174,86,191,-28,4,-174,-103,7,-248,88,-124,174,86,191,1,0,5,0,-4,2,-2,0,-3,0,-2,321,321,320,308,310,310,318,304,279,288,306,306,11.368391686,11.058010953,10.844279642,10.139151108,10.79319468,10.946600239,9.5386719503,9.0077459605,10.228304126,8.0381376575,8.1601339099,9.1394286113,8.8853129974,7.5169568562,9.4966096052,9.0519963511,9.1529168347,9.9540850303,10.228304126,11.204676735,3.2082577765,1.9185823421,1.9589666451,2.6221942522,1.2965850753,1.8946038874,0.3857551156,-0.94633907,0,-3.166539077,0.2789789371,0.3139498378,0,-0.03496259,0,0.0350852572,0,0,0,0,-0.139489469,-6.383646702,-3.603099365,0.2797007202,-8.690624288,3.0524173742,-4.348512213,6.0986295608,3.002164351,6.6462523488,0.1394894685,-6.069696864,-3.603099365,0.2447381302,-8.690624288,3.0875026314,-4.348512213,6.0986295608,3.002164351,6.6462523488 +050,3,5,13,171,Georgia,Lamar County,18317,18307,18260,18153,18026,17926,18187,18229,18462,18582,18866,19001,19261,-47,-107,-127,-100,261,42,233,120,284,135,260,46,202,193,185,184,219,202,211,201,223,216,41,193,190,186,225,214,201,218,216,220,235,5,9,3,-1,-41,5,1,-7,-15,3,-19,1,5,12,32,28,28,37,22,20,20,12,-55,-122,-151,-132,264,13,193,106,277,112,267,-54,-117,-139,-100,292,41,230,128,297,132,279,2,1,9,1,10,-4,2,-1,2,0,0,1455,1397,1312,1178,1141,1289,1219,1230,1086,1255,1175,1175,11.094938621,10.669172725,10.291499777,10.190236203,12.027680141,11.010874601,11.391858331,10.734885708,11.778065334,11.290575506,10.600609672,10.503330661,10.347129506,12.460886661,11.753075571,10.956365321,11.76978728,11.535996582,11.619616025,12.283727981,0.4943289485,0.1658420631,-0.055629729,-2.270650458,0.2746045694,0.0545092802,-0.377928949,-0.801110874,0.1584493094,-0.993152475,0.2746271936,0.6633682523,1.7801513129,1.5506881179,1.5377855888,2.0168433676,1.187776698,1.0681478317,1.0563287295,0.6272541948,-6.700903523,-8.347383841,-7.343124166,14.620773683,0.7139718805,10.52029108,5.7229240903,14.793847468,5.9154408852,13.956405833,-6.42627633,-7.684015589,-5.562972853,16.1714618,2.2517574692,12.537134447,6.9107007883,15.8619953,6.9717696147,14.583660028 +050,3,5,13,173,Georgia,Lanier County,10078,10076,10103,10481,10462,10405,10362,10264,10444,10456,10450,10581,10737,27,378,-19,-57,-43,-98,180,12,-6,131,156,28,132,123,131,141,147,149,152,140,135,127,34,75,78,95,79,98,75,98,88,102,123,-6,57,45,36,62,49,74,54,52,33,4,2,4,31,9,7,11,19,15,10,14,11,30,312,-93,-105,-114,-158,86,-56,-67,85,141,32,316,-62,-96,-107,-147,105,-41,-57,99,152,1,5,-2,3,2,0,1,-1,-1,-1,0,260,260,255,260,246,214,227,180,183,228,260,260,12.825495531,11.746168171,12.555709973,13.579236288,14.253854359,14.390573691,14.545454545,13.393284225,12.838191242,11.914813772,7.2872133696,7.4487895717,9.1052858581,7.6082245871,9.5025695724,7.2435773614,9.3779904306,8.4186357983,9.6999667158,11.539544047,5.5382821609,4.2973785991,3.4504241146,5.9710117013,4.7512847862,7.1469963299,5.1674641148,4.9746484263,3.1382245257,0.3752697251,0.3886513797,2.9604163682,0.8626060287,0.6741464824,1.066614952,1.8350395982,1.4354066986,0.9566631589,1.3313679806,1.0319917441,30.314807618,-8.881249105,-10.063737,-10.978957,-15.32046931,8.3059687077,-5.358851675,-6.409643165,8.0833055965,13.22825781,30.703458997,-5.920832736,-9.201130972,-10.30481052,-14.25385436,10.141008306,-3.923444976,-5.452980006,9.4146735771,14.260249554 +050,3,5,13,175,Georgia,Laurens County,48434,48436,48388,47841,47819,47727,47553,47491,47287,47362,47293,47567,47512,-48,-547,-22,-92,-174,-62,-204,75,-69,274,-55,178,628,699,661,630,631,633,657,597,642,620,164,512,552,558,546,524,546,590,567,597,634,14,116,147,103,84,107,87,67,30,45,-14,1,6,12,4,11,18,26,8,8,7,6,-62,-671,-178,-195,-268,-187,-316,2,-106,223,-49,-61,-665,-166,-191,-257,-169,-290,10,-98,230,-43,-1,2,-3,-4,-1,0,-1,-2,-1,-1,2,1058,1060,1033,1038,1069,936,1042,968,1026,968,1185,1184,13.052198402,14.614258833,13.836267348,13.22418136,13.278060688,13.357530229,13.882872508,12.614230627,13.535736875,13.041786304,10.641282773,11.540873928,11.680237791,11.460957179,11.02647195,11.521661145,12.467115342,11.980349691,12.586970272,13.336278253,2.4109156283,3.0733849049,2.1560295564,1.7632241814,2.2515887378,1.8358690835,1.4157571659,0.633880936,0.9487666034,-0.294491949,0.1247025325,0.2508885637,0.0837293032,0.2308984047,0.3787719372,0.5486505307,0.1690456318,0.1690349163,0.1475859161,0.1262108352,-13.94589988,-3.721513694,-4.081803529,-5.625524769,-3.93501957,-6.668214143,0.0422614079,-2.239712641,4.7016656125,-1.030721821,-13.82119735,-3.470625131,-3.998074226,-5.394626364,-3.556247633,-6.119563612,0.2113070397,-2.070677724,4.8492515286,-0.904510986 +050,3,5,13,177,Georgia,Lee County,28298,28295,28417,28585,28718,29055,29139,29191,29203,29429,29764,30045,30234,122,168,133,337,84,52,12,226,335,281,189,76,362,377,364,365,369,331,324,350,345,334,68,149,170,201,204,209,204,214,254,251,277,8,213,207,163,161,160,127,110,96,94,57,3,6,24,28,19,19,29,9,10,5,5,104,-50,-105,147,-101,-130,-145,108,231,183,127,107,-44,-81,175,-82,-111,-116,117,241,188,132,7,-1,7,-1,5,3,1,-1,-2,-1,0,828,879,941,872,920,928,914,869,877,929,906,907,12.701308726,13.158124356,12.601042009,12.544248548,12.652151552,11.336781176,11.051985264,11.825722636,11.536725242,11.08180295,5.2278867408,5.9333717257,6.9582677029,7.0110320652,7.1661237785,6.9870192143,7.2997680448,8.5820958559,8.3933856109,9.190597057,7.4734219852,7.2247526308,5.6427743063,5.5332164828,5.486027773,4.3497619618,3.7522172193,3.2436267802,3.1433396312,1.8912058926,0.2105189292,0.8376524789,0.9693109238,0.6529882806,0.651465798,0.9932527314,0.3069995907,0.3378777896,0.1671989166,0.1658952537,-1.75432441,-3.664729595,5.0888823499,-3.471148228,-4.457397566,-4.966263657,3.683995088,7.8049769398,6.1194803458,4.2137394449,-1.543805481,-2.827077116,6.0581932737,-2.818159948,-3.805931768,-3.973010926,3.9909946787,8.1428547294,6.2866792623,4.3796346987 +050,3,5,13,179,Georgia,Liberty County,63453,63584,62772,65210,64482,62438,64217,61762,61672,61819,60887,62813,63004,-812,2438,-728,-2044,1779,-2455,-90,147,-932,1926,191,354,1220,1690,1424,1363,1524,1420,1390,1444,1353,1429,113,302,303,312,303,350,360,381,394,388,390,241,918,1387,1112,1060,1174,1060,1009,1050,965,1039,90,104,866,362,342,464,279,85,1,5,37,-1238,1404,-3082,-3627,332,-4150,-1431,-939,-1990,955,-880,-1148,1508,-2216,-3265,674,-3686,-1152,-854,-1989,960,-843,95,12,101,109,45,57,2,-8,7,1,-5,2579,2579,2550,1544,883,1594,1766,1608,1868,1224,2346,2349,19.065181041,26.061746291,22.439331863,21.523035016,24.194508609,23.008247322,22.511761991,23.535931413,21.875505255,22.715531288,4.7194136675,4.6726089504,4.9164828238,4.7846512179,5.5564816358,5.833076786,6.1704901572,6.4218538621,6.2732417138,6.1994801974,14.345767374,21.389137341,17.522849039,16.738383799,18.638026973,17.175170536,16.341271834,17.114077551,15.602263541,16.51605109,1.6252285478,13.35471733,5.7043807123,5.4004974142,7.3663070829,4.5206345091,1.376618539,0.0162991215,0.0808407437,0.5881558136,21.940585395,-47.52798939,-57.15411283,5.2425881331,-65.88399654,-23.18648022,-15.20758598,-32.43525174,15.440582053,-13.9885707,23.565813943,-34.17327206,-51.44973211,10.643085547,-58.51768946,-18.66584572,-13.83096744,-32.41895262,15.521422797,-13.40041489 +050,3,5,13,181,Georgia,Lincoln County,7996,7996,7970,7872,7764,7734,7644,7720,7859,7859,7927,7969,8031,-26,-98,-108,-30,-90,76,139,0,68,42,62,10,60,74,70,66,86,88,85,68,79,78,9,81,83,100,84,88,80,106,102,75,110,1,-21,-9,-30,-18,-2,8,-21,-34,4,-32,0,0,7,6,5,3,5,3,3,3,3,-28,-78,-107,-5,-79,76,126,18,100,35,92,-28,-78,-100,1,-74,79,131,21,103,38,95,1,1,1,-1,2,-1,0,0,-1,0,-1,67,67,67,67,56,67,48,59,67,58,67,67,7.5748011615,9.4653364032,9.0334236676,8.5836909871,11.195001302,11.297259131,10.815625398,8.6152286836,9.9396074484,9.75,10.225981568,10.616525966,12.904890954,10.92469762,11.455350169,10.270235574,13.487721084,12.922843025,9.4363361852,13.75,-2.651180407,-1.151189563,-3.871467286,-2.341006633,-0.260348867,1.0270235574,-2.672095686,-4.307614342,0.5032712632,-4,0,0.8953696598,0.7742934572,0.6502796202,0.3905233012,0.6418897233,0.3817279552,0.3800836184,0.3774534474,0.375,-9.84724151,-13.6863648,-0.645244548,-10.274418,9.8932569643,16.175621028,2.2903677313,12.669453947,4.4036235531,11.5,-9.84724151,-12.79099514,0.1290489095,-9.62413838,10.283780266,16.817510752,2.6720956865,13.049537565,4.7810770005,11.875 +050,3,5,13,183,Georgia,Long County,14464,14345,14575,15097,16013,16510,17058,17695,18392,18822,19148,19647,20171,230,522,916,497,548,637,697,430,326,499,524,48,152,250,241,261,306,273,284,299,299,261,5,75,92,89,96,105,105,87,98,90,116,43,77,158,152,165,201,168,197,201,209,145,7,9,81,63,27,54,41,9,-10,7,2,169,433,648,275,345,375,487,223,134,282,379,176,442,729,338,372,429,528,232,124,289,381,11,3,29,7,11,7,1,1,1,1,-2,328,328,328,328,328,298,330,321,328,329,329,330,10.245349151,16.072002572,14.820281032,15.550524309,17.609990504,15.130102253,15.263073037,15.749275744,15.41435752,13.109648903,5.0552709625,5.9144969463,5.4730498417,5.7197330791,6.0426438005,5.8192700973,4.675659698,5.1619699763,4.6397731666,5.8265106233,5.1900781882,10.157505625,9.3472311902,9.8307912297,11.567346704,9.3108321556,10.587413339,10.587305768,10.774584354,7.2831382792,0.6066325155,5.2073288332,3.8741813486,1.6086749285,3.1076453831,2.2722864189,0.4836889343,-0.52673163,0.3608712463,0.1004570797,29.185764357,41.658630665,16.911109061,20.555290753,21.580870716,26.990328927,11.984736927,7.0582038451,14.537955922,19.036616606,29.792396872,46.865959499,20.78529041,22.163965682,24.688516099,29.262615346,12.468425861,6.5314722149,14.898827168,19.137073685 +050,3,5,13,185,Georgia,Lowndes County,109233,109257,109704,111519,114141,112985,113630,113501,114457,115495,116361,117600,118268,447,1815,2622,-1156,645,-129,956,1038,866,1239,668,416,1775,1658,1643,1595,1629,1555,1586,1551,1651,1639,237,835,735,862,767,863,817,953,945,964,1046,179,940,923,781,828,766,738,633,606,687,593,58,101,380,285,208,311,268,124,56,105,73,193,769,1244,-2286,-389,-1220,-47,287,208,445,-9,251,870,1624,-2001,-181,-909,221,411,264,550,64,17,5,75,64,-2,14,-3,-6,-4,2,11,6410,6452,6516,6769,6536,6297,6064,6429,6236,5967,6065,6067,16.047156037,14.694673402,14.467740373,14.07673808,14.344145009,13.642864036,13.794183134,13.378993858,14.113463355,13.897603744,7.5489438259,6.5142249402,7.5905004271,6.769190036,7.599138823,7.1679870853,8.2886863345,8.151611345,8.2406896876,8.8693676124,8.4982122112,8.1804484623,6.8772399461,7.307548044,6.7450061859,6.474876951,5.5054967993,5.2273825133,5.8727736674,5.0282361321,0.9131057801,3.3678986085,2.5096202108,1.8357125521,2.7385077334,2.3513103291,1.0784859449,0.4830584501,0.897585495,0.6189902827,6.9522608409,11.025436497,-20.1297958,-3.433135494,-10.74269915,-0.412356662,2.4961731144,1.7942171003,3.8040528122,-0.07631387,7.865366621,14.393335106,-17.62017559,-1.597422942,-8.004191414,1.9389536669,3.5746590593,2.2772755503,4.7016383072,0.5426764122 +050,3,5,13,187,Georgia,Lumpkin County,29966,29947,30281,30453,30684,30872,31122,31292,31422,32812,32934,33692,34186,334,172,231,188,250,170,130,1390,122,758,494,85,308,357,298,314,260,286,314,279,290,286,37,225,220,237,240,274,281,297,322,302,328,48,83,137,61,74,-14,5,17,-43,-12,-42,8,13,11,6,6,-1,-1,-4,-5,-10,-3,242,75,85,118,170,183,126,1363,169,779,541,250,88,96,124,176,182,125,1359,164,769,538,36,1,-2,3,0,2,0,14,1,1,-2,1782,2063,2100,2319,2431,2547,2468,2308,2882,2768,3055,3054,10.142588995,11.678688846,9.6822405614,10.130012582,8.3314640946,9.1207704819,9.7767537441,8.4872083473,8.7053102392,8.4268835263,7.4093588435,7.1969511098,7.700305413,7.7426847759,8.780081392,8.9613164525,9.247439051,9.7952727162,9.0655299733,9.6643978903,2.7332301512,4.4817377366,1.9819351485,2.3873278059,-0.448617297,0.1594540294,0.5293146932,-1.308064369,-0.360219734,-1.237514364,0.4280962887,0.3598475555,0.1949444408,0.1935671194,-0.032044093,-0.031890806,-0.124544634,-0.152100508,-0.300183112,-0.088393883,2.4697862812,2.7806402015,3.8339073364,5.4844017163,5.8640689589,4.018241541,42.438583928,5.1409971709,23.384264401,15.940363594,2.8978825699,3.140487757,4.0288517772,5.6779688357,5.8320248662,3.9863507351,42.314039294,4.9888966629,23.08408129,15.85196971 +050,3,5,13,189,Georgia,McDuffie County,21875,21865,21803,21614,21630,21506,21529,21470,21481,21517,21545,21317,21162,-62,-189,16,-124,23,-59,11,36,28,-228,-155,84,304,301,299,307,267,310,281,280,261,270,113,241,190,247,210,240,214,246,282,250,288,-29,63,111,52,97,27,96,35,-2,11,-18,0,-3,-9,-8,-8,-8,-13,-14,-16,-18,-13,-32,-250,-86,-170,-62,-77,-72,16,47,-220,-124,-32,-253,-95,-178,-70,-85,-85,2,31,-238,-137,-1,1,0,2,-4,-1,0,-1,-1,-1,0,318,319,320,314,287,268,275,266,287,287,265,265,14.003731257,13.921006382,13.863130564,14.267456721,12.418893463,14.435053899,13.070375366,13.004505132,12.178619756,12.712163657,11.101642214,8.7873462214,11.452151335,9.759498083,11.163050303,9.9648436591,11.442392669,13.097394455,11.665344594,13.559641234,2.9020890435,5.1336601609,2.4109792285,4.5079586383,1.2558431591,4.4702102396,1.6279826969,-0.092889322,0.5132751621,-0.847477577,-0.138194716,-0.416242716,-0.370919881,-0.371790403,-0.372101677,-0.60534097,-0.651193079,-0.743114579,-0.839904811,-0.612067139,-11.51622636,-3.977430395,-7.882047478,-2.881375624,-3.581478639,-3.35265768,0.7442206614,2.1828990758,-10.26550324,-5.838178865,-11.65442108,-4.393673111,-8.252967359,-3.253166028,-3.953580316,-3.95799865,0.0930275827,1.4397844968,-11.10540805,-6.450246004 +050,3,5,13,191,Georgia,McIntosh County,14333,14332,14312,14226,13887,14030,14067,14033,14068,14092,14243,14294,14387,-20,-86,-339,143,37,-34,35,24,151,51,93,25,135,109,137,125,114,112,121,105,107,103,11,124,105,117,121,146,131,145,132,126,143,14,11,4,20,4,-32,-19,-24,-27,-19,-40,0,0,0,0,0,-1,5,3,3,3,2,-33,-97,-356,119,33,2,49,45,176,66,131,-33,-97,-356,119,33,1,54,48,179,69,133,-1,0,13,4,0,-3,0,0,-1,1,0,71,84,124,71,71,71,71,70,71,72,71,71,9.4610694513,7.7544196635,9.8148081814,8.8977470904,8.1138790036,7.9712465749,8.59375,7.4113287454,7.4990363388,7.182455284,8.690167496,7.4698538043,8.3819894688,8.6130191835,10.391459075,9.3235116188,10.298295455,9.3170989942,8.8306409223,9.9717583069,0.7709019553,0.2845658592,1.4328187126,0.2847279069,-2.277580071,-1.352265044,-1.704545455,-1.905770249,-1.331604584,-2.789303023,0,0,0,0,-0.071174377,0.3558592221,0.2130681818,0.2117522499,0.2102533553,0.1394651511,-6.797953606,-25.32636147,8.52527134,2.3490052319,0.1423487544,3.4874203765,3.1960227273,12.422798659,4.6255738164,9.1349674,-6.797953606,-25.32636147,8.52527134,2.3490052319,0.0711743772,3.8432795986,3.4090909091,12.634550909,4.8358271717,9.2744325512 +050,3,5,13,193,Georgia,Macon County,14740,14743,14644,14452,14297,13973,13822,13689,13483,13255,13153,12934,12712,-99,-192,-155,-324,-151,-133,-206,-228,-102,-219,-222,34,155,154,126,121,142,140,146,120,133,131,52,151,142,134,153,156,149,174,162,154,180,-18,4,12,-8,-32,-14,-9,-28,-42,-21,-49,7,20,19,4,5,7,8,1,0,0,0,-93,-218,-190,-326,-128,-125,-207,-201,-60,-198,-174,-86,-198,-171,-322,-123,-118,-199,-200,-60,-198,-174,5,2,4,6,4,-1,2,0,0,0,1,1960,1960,1960,1954,1940,1883,1905,1914,1902,1939,1894,1893,10.654385483,10.713416119,8.9140431553,8.7066019068,10.32314347,10.304725453,10.920786895,9.0881551045,10.196649672,10.216018092,10.379433599,9.8786044732,9.4800141493,11.009174312,11.340918178,10.967172089,13.015184382,12.269009391,11.806646989,14.037276768,0.2749518834,0.8348116456,-0.565970994,-2.302572405,-1.017774708,-0.662446636,-2.094397487,-3.180854287,-1.609997317,-3.821258676,1.3747594171,1.3217851056,0.282985497,0.3597769383,0.5088873541,0.5888414544,0.0747999102,0,0,0,-14.98487765,-13.21785106,-23.063318,-9.21028962,-9.087274181,-15.23627263,-15.03478196,-4.544077552,-15.1799747,-13.56936754,-13.61011823,-11.89606595,-22.78033251,-8.850512682,-8.578386827,-14.64743118,-14.95998205,-4.544077552,-15.1799747,-13.56936754 +050,3,5,13,195,Georgia,Madison County,28120,28174,28221,28186,28081,28213,28376,28431,28833,29253,29653,29925,30457,47,-35,-105,132,163,55,402,420,400,272,532,91,325,318,334,346,352,332,345,339,333,355,42,285,284,289,309,295,268,294,287,324,320,49,40,34,45,37,57,64,51,52,9,35,2,15,17,30,16,30,13,5,3,5,2,-1,-91,-157,62,114,-29,325,363,346,258,498,1,-76,-140,92,130,1,338,368,349,263,500,-3,1,1,-5,-4,-3,0,1,-1,0,-3,204,216,250,209,210,251,241,250,254,250,248,248,11.523392487,11.303250573,11.866273493,12.228524978,12.392838911,11.595417714,11.878938126,11.509863172,11.178622982,11.758471068,10.105128796,10.094726927,10.26752407,10.920850342,10.386043973,9.3601564683,10.122921186,9.7443384375,10.876498036,10.599185188,1.4182636907,1.2085236462,1.5987494227,1.3076746364,2.0067949372,2.2352612462,1.7560169404,1.7655247343,0.3021249454,1.1592858799,0.531848884,0.6042618231,1.0658329484,0.5654809239,1.0562078617,0.4540374406,0.1721585236,0.1018571962,0.1678471919,0.0662449074,-3.226549896,-5.58053566,2.2027214268,4.0290515825,-1.021000933,11.350936016,12.498708811,11.747529963,8.6609151029,16.494981948,-2.694701012,-4.976273837,3.2685543752,4.5945325063,0.0352069287,11.804973456,12.670867335,11.849387159,8.8287622948,16.561226856 +050,3,5,13,197,Georgia,Marion County,8742,8738,8741,8699,8672,8581,8636,8561,8490,8438,8392,8413,8516,3,-42,-27,-91,55,-75,-71,-52,-46,21,103,24,103,99,82,94,86,88,87,81,91,83,32,75,88,60,77,84,77,86,95,68,108,-8,28,11,22,17,2,11,1,-14,23,-25,4,20,21,-1,-3,4,17,13,18,-5,3,8,-90,-62,-112,40,-82,-99,-67,-50,3,126,12,-70,-41,-113,37,-78,-82,-54,-32,-2,129,-1,0,3,0,1,1,0,1,0,0,-1,79,79,75,75,77,74,76,74,67,79,76,75,11.811926606,11.398307524,9.5055932302,10.919440088,10.00174449,10.321975251,10.278827977,9.6256684492,10.830110086,9.8056589285,8.6009174312,10.13182891,6.9553121196,8.9446477319,9.7691457812,9.0317283444,10.160680529,11.289364231,8.092829515,12.759170654,3.2110091743,1.2664786138,2.5502811105,1.9747923564,0.2325987091,1.2902469063,0.118147448,-1.663695781,2.7372805713,-2.953511725,2.2935779817,2.4178228081,-0.115921869,-0.348492769,0.4651974182,1.9940179462,1.5359168242,2.1390374332,-0.595060994,0.3544214071,-10.32110092,-7.138334005,-12.98324929,4.6465702503,-9.536547072,-11.61222216,-7.915879017,-5.941770648,0.3570365963,14.885699096,-8.027522936,-4.720511197,-13.09917116,4.2980774816,-9.071349654,-9.618204211,-6.379962193,-3.802733214,-0.238024398,15.240120503 +050,3,5,13,199,Georgia,Meriwether County,21992,21976,21817,21596,21331,21214,21201,21167,21052,21011,21061,21112,21164,-159,-221,-265,-117,-13,-34,-115,-41,50,51,52,60,243,282,209,258,280,242,261,254,234,234,86,252,230,242,257,262,289,298,264,282,307,-26,-9,52,-33,1,18,-47,-37,-10,-48,-73,1,2,2,0,1,2,2,-1,-1,-2,-1,-142,-214,-323,-84,-10,-52,-69,0,62,100,127,-141,-212,-321,-84,-9,-50,-67,-1,61,98,126,8,0,4,0,-5,-2,-1,-3,-1,1,-1,253,259,260,268,249,248,245,245,245,247,245,245,11.1948034,13.138584108,9.8248912916,12.165507486,13.217522659,11.464032781,12.409956494,12.074538886,11.097147464,11.070110701,11.609425748,10.715866471,11.376189917,12.118354356,12.367824773,13.690518487,14.169222357,12.549914432,13.373485405,14.523606775,-0.414622348,2.4227176369,-1.551298625,0.0471531298,0.8496978852,-2.226485705,-1.759265863,-0.475375547,-2.276337941,-3.453496073,0.0921382996,0.0931814476,0,0.0471531298,0.0944108761,0.0947440726,-0.047547726,-0.047537555,-0.094847414,-0.047308165,-9.858798056,-15.04880378,-3.948760136,-0.471531298,-2.454682779,-3.268670504,0,2.9473283894,4.7423707111,6.0081370044,-9.766659756,-14.95562234,-3.948760136,-0.424378168,-2.360271903,-3.173926431,-0.047547726,2.8997908348,4.6475232969,5.9608288391 +050,3,5,13,201,Georgia,Miller County,6125,6127,6133,6072,6004,5900,5943,5847,5875,5816,5646,5667,5622,6,-61,-68,-104,43,-96,28,-59,-170,21,-45,10,90,73,67,67,64,62,59,72,70,66,10,89,71,86,64,89,89,96,85,79,91,0,1,2,-19,3,-25,-27,-37,-13,-9,-25,1,1,4,0,0,0,0,0,0,0,0,6,-63,-76,-87,42,-72,56,-22,-158,30,-19,7,-62,-72,-87,42,-72,56,-22,-158,30,-19,-1,0,2,2,-2,1,-1,0,1,0,-1,168,171,183,171,173,152,138,127,145,125,127,127,14.748054076,12.090096058,11.25672043,11.314700667,10.856658185,10.578399591,10.093234112,12.563252486,12.37514364,11.692798299,14.584186809,11.75886055,14.448924731,10.808072279,15.097540288,15.185121993,16.422889402,14.831617519,13.966233537,16.121888564,0.1638672675,0.3312355084,-3.192204301,0.5066283881,-4.240882103,-4.606722402,-6.32965529,-2.268365032,-1.591089897,-4.429090265,0.1638672675,0.6624710169,0,0,0,0,0,0,0,0,-10.32363785,-12.58694932,-14.61693548,7.0927974331,-12.21374046,9.5546835011,-3.763578821,-27.56935962,5.3036329886,-3.366108601,-10.15977059,-11.9244783,-14.61693548,7.0927974331,-12.21374046,9.5546835011,-3.763578821,-27.56935962,5.3036329886,-3.366108601 +050,3,5,13,205,Georgia,Mitchell County,23498,23500,23502,23399,23086,22990,22712,22449,22443,22313,22156,21846,21602,2,-103,-313,-96,-278,-263,-6,-130,-157,-310,-244,77,300,294,289,244,280,260,262,244,241,215,74,234,222,236,218,262,242,254,286,283,259,3,66,72,53,26,18,18,8,-42,-42,-44,0,-7,-1,3,6,28,26,16,13,11,10,1,-162,-396,-152,-316,-313,-48,-154,-128,-279,-208,1,-169,-397,-149,-310,-285,-22,-138,-115,-268,-198,-2,0,12,0,6,4,-2,0,0,0,-2,2135,2156,2174,2162,2182,2180,2092,2224,2248,2179,2108,2108,12.792904202,12.649241691,12.544491709,10.677869677,12.400079715,11.583355609,11.707927429,10.9739369,10.954047543,9.8968882342,9.9784652779,9.5514682156,10.243944787,9.5400638922,11.602931733,10.78143099,11.350433461,12.862893251,12.863051679,11.922297919,2.8144389245,3.0977734753,2.3005469225,1.1378057853,0.7971479817,0.8019246191,0.3574939673,-1.888956352,-1.909004136,-2.025409685,-0.298501098,-0.043024632,0.1302196371,0.2625705658,1.2400079715,1.1583355609,0.7149879346,0.584676966,0.4999772738,0.460320383,-6.908168269,-17.03775411,-6.597794947,-13.82871647,-13.86151768,-2.138465651,-6.88175887,-5.756819357,-12.68124176,-9.574663966,-7.206669367,-17.08077875,-6.46757531,-13.5661459,-12.62150971,-0.98013009,-6.166770936,-5.172142391,-12.18126449,-9.114343583 +050,3,5,13,207,Georgia,Monroe County,26424,26121,26133,26301,26336,26585,26637,26683,26880,27153,27523,27677,28042,12,168,35,249,52,46,197,273,370,154,365,73,272,298,263,278,261,270,276,256,274,245,86,237,229,254,251,256,278,301,312,314,346,-13,35,69,9,27,5,-8,-25,-56,-40,-101,1,5,6,-3,8,-4,5,4,2,1,4,27,129,-39,244,22,49,202,294,426,192,466,28,134,-33,241,30,45,207,298,428,193,470,-3,-1,-1,-1,-5,-4,-2,0,-2,1,-4,1208,1189,1155,1167,1137,1219,1189,1065,1131,1200,1157,1153,10.374947553,11.322833748,9.9393435498,10.446807711,9.7899474869,10.08158617,10.215979124,9.3642548833,9.9275362319,8.7941276764,9.0399359194,8.7011037863,9.5992139226,9.432189696,9.6024006002,10.380299834,11.141339552,11.412685639,11.376811594,12.419461943,1.3350116337,2.6217299618,0.3401296272,1.0146180151,0.1875468867,-0.298713664,-0.925360428,-2.048430756,-1.449275362,-3.625334267,0.1907159477,0.2279765184,-0.113376542,0.30062756,-0.150037509,0.1866960402,0.1480576685,0.0731582413,0.0362318841,0.1435775947,4.9204714498,-1.48184737,9.2212921147,0.8267257901,1.8379594899,7.5425200232,10.882238632,15.582705392,6.9565217391,16.726789784,5.1111873975,-1.253870851,9.1079155723,1.1273533501,1.6879219805,7.7292160633,11.0302963,15.655863633,6.9927536232,16.870367379 +050,3,5,13,209,Georgia,Montgomery County,9123,9177,9140,9027,8883,8954,8978,8939,8996,9032,9157,9148,9012,-37,-113,-144,71,24,-39,57,36,125,-9,-136,33,112,103,110,95,79,93,86,105,98,98,34,86,75,91,65,108,80,85,96,85,98,-1,26,28,19,30,-29,13,1,9,13,0,0,-1,4,11,3,4,12,7,7,7,5,-38,-139,-183,40,-7,-14,34,28,107,-29,-140,-38,-140,-179,51,-4,-10,46,35,114,-22,-135,2,1,7,1,-2,0,-2,0,2,0,-1,732,713,685,612,683,723,747,747,747,813,806,806,12.33004899,11.501954216,12.333912653,10.595583315,8.8184405872,10.370783384,9.5407144442,11.545439551,10.707456979,10.792951542,9.4677161887,8.3752093802,10.203509559,7.2496096364,12.055589663,8.9211039866,9.4297759041,10.555830447,9.2870800328,10.792951542,2.8623328012,3.1267448353,2.1304030947,3.3459736783,-3.237149076,1.4496793978,0.11093854,0.9896091044,1.4203769462,0,-0.110089723,0.4466778336,1.2333912653,0.3345973678,0.4465033209,1.338165598,0.7765697803,0.7696959701,0.7648183556,0.550660793,-15.30247151,-20.43551089,4.4850591467,-0.780727192,-1.562761623,3.7914691943,3.1062791214,11.765352686,-3.168533188,-15.4185022,-15.41256124,-19.98883305,5.7184504121,-0.446129824,-1.116258302,5.1296347923,3.8828489017,12.535048656,-2.403714832,-14.86784141 +050,3,5,13,211,Georgia,Morgan County,17868,17867,17897,17906,17807,17681,17894,17947,18097,18374,18808,19239,19636,30,9,-99,-126,213,53,150,277,434,431,397,57,198,183,151,207,188,189,223,197,211,210,24,193,170,186,175,189,190,192,191,173,168,33,5,13,-35,32,-1,-1,31,6,38,42,-1,-2,-3,-1,-1,0,2,3,1,0,3,-1,7,-110,-90,179,54,150,243,430,394,353,-2,5,-113,-91,178,54,152,246,431,394,356,-1,-1,1,0,3,0,-1,0,-3,-1,-1,154,157,167,155,143,147,145,139,144,163,163,163,11.060525654,10.248368941,8.5099188458,11.637385805,10.490778717,10.487182333,12.22889419,10.5965252,11.091544668,10.803858521,10.781219451,9.5203427323,10.482416592,9.8383696416,10.546580732,10.54267007,10.528913383,10.273788392,9.0940152969,8.6430868167,0.2793062034,0.7280262089,-1.972497746,1.799016163,-0.055802014,-0.055487737,1.6999808067,0.3227368081,1.9975293716,2.1607717042,-0.111722481,-0.168006048,-0.056357078,-0.056219255,0,0.1109754744,0.1645142716,0.053789468,0,0.154340836,0.3910286847,-6.160221768,-5.07213706,10.063246662,3.0133087804,8.3231605815,13.325656001,23.12947125,20.711225589,18.160771704,0.2793062034,-6.328227816,-5.128494139,10.007027407,3.0133087804,8.4341360559,13.490170272,23.183260718,20.711225589,18.31511254 +050,3,5,13,213,Georgia,Murray County,39628,39628,39532,39363,39311,39173,39212,39426,39322,39761,39836,39996,40032,-96,-169,-52,-138,39,214,-104,439,75,160,36,110,500,487,518,520,498,484,513,480,491,465,85,345,326,370,368,361,378,397,382,390,455,25,155,161,148,152,137,106,116,98,101,10,-1,-3,1,10,4,70,39,9,3,0,2,-125,-321,-214,-300,-109,11,-249,315,-25,58,22,-126,-324,-213,-290,-105,81,-210,324,-22,58,24,5,0,0,4,-8,-4,0,-1,-1,1,2,254,255,255,255,228,230,264,177,259,273,272,273,12.675074466,12.380201846,13.200142704,13.267844613,12.665632391,12.292375679,12.973711164,12.060756059,12.300831747,11.620932674,8.7458013816,8.2873630424,9.4286733602,9.3895515724,9.181311834,9.6002438157,10.040084468,9.5983516967,9.770518088,11.371020143,3.9292730845,4.0928388032,3.7714693441,3.8782930408,3.4843205575,2.6921318637,2.933626696,2.462404362,2.5303136587,0.2499125306,-0.076050447,0.025421359,0.2548290097,0.1020603432,1.7803097739,0.9905013461,0.2276089678,0.0753797254,0,0.0499825061,-8.137397807,-5.440170832,-7.644870292,-2.781144352,0.2797629645,-6.323970133,7.9663138728,-0.628164378,1.453051408,0.5498075674,-8.213448254,-5.414749473,-7.390041282,-2.679084008,2.0600727384,-5.333468787,8.1939228406,-0.552784653,1.453051408,0.5997900735 +050,3,5,13,215,Georgia,Muscogee County,189885,190570,191122,195340,199077,203370,200746,198925,196354,193858,194362,196074,196442,552,4218,3737,4293,-2624,-1821,-2571,-2496,504,1712,368,831,3025,3336,3177,3115,3013,2994,2832,2830,2741,2794,390,1760,1746,1795,1840,1804,1974,1964,1972,2050,2102,441,1265,1590,1382,1275,1209,1020,868,858,691,692,164,272,1243,747,560,816,529,240,130,161,145,-29,2658,890,2075,-4607,-3900,-4138,-3623,-481,853,-481,135,2930,2133,2822,-4047,-3084,-3609,-3383,-351,1014,-336,-24,23,14,89,148,54,18,19,-3,7,12,7677,7735,7796,7643,7782,7687,7089,6444,6357,6360,6869,6861,15.654837992,16.916106557,15.788414375,15.416365598,15.077401162,15.148793637,14.515186617,14.579362217,14.040713459,14.236362339,9.1082693771,8.8535737557,8.9204292739,9.106296212,9.0274250571,9.987881977,10.066322922,10.159188089,10.501080843,10.710391424,6.5465686148,8.0625328016,6.8679851011,6.310069386,6.0499761053,5.1609116599,4.4488636946,4.4201741281,3.5396326158,3.5259709158,1.407641631,6.3029737562,3.7122900655,2.7714814558,4.0833585624,2.6765904589,1.2301005607,0.6697233527,0.8247190321,0.7388233855,13.755556821,4.5129900587,10.311916849,-22.80038405,-19.51605195,-20.93711024,-18.56939305,-2.477976405,4.3694741264,-2.450855507,15.163198452,10.815963815,14.024206914,-20.02890259,-15.43269339,-18.26051978,-17.33929249,-1.808253052,5.1941931584,-1.712032121 +050,3,5,13,217,Georgia,Newton County,99958,99964,100128,100446,100965,102060,103470,104920,106529,107903,109556,111894,113295,164,318,519,1095,1410,1450,1609,1374,1653,2338,1401,341,1377,1299,1313,1345,1304,1339,1393,1313,1383,1401,225,730,718,825,824,865,825,850,892,976,1049,116,647,581,488,521,439,514,543,421,407,352,3,24,58,62,59,77,108,67,54,47,45,54,-355,-103,557,832,933,989,768,1177,1890,1006,57,-331,-45,619,891,1010,1097,835,1231,1937,1051,-9,2,-17,-12,-2,1,-2,-4,1,-6,-2,1792,1801,1799,1797,1654,1705,1650,1491,1632,1637,1649,1649,13.730593198,12.898997572,12.934367689,13.088113657,12.514995921,12.664992504,12.992463811,12.075839584,12.490404154,12.442881313,7.2791089573,7.1296999667,8.1270779461,8.0182941663,8.3017419262,7.8033000865,7.9279212058,8.2038453226,8.8146308422,9.3166184849,6.4514842402,5.7692976054,4.8072897426,5.0698194911,4.2132539949,4.8616924176,5.0645426056,3.871994261,3.6757733123,3.1262628281,0.2393131712,0.5759367661,0.6107622214,0.5741254318,0.7389989923,1.0215229204,0.6249067303,0.4966453446,0.4244750508,0.399664282,-3.539840657,-1.022784257,5.487008989,8.0961416825,8.9543644129,9.3545015583,7.1631099836,10.825029086,17.069315873,8.9347170599,-3.300527486,-0.446847491,6.0977712104,8.6702671143,9.6933634052,10.376024479,7.7880167139,11.321674431,17.493790923,9.3343813419 +050,3,5,13,219,Georgia,Oconee County,32808,32840,32935,33269,33521,34084,35077,35861,36928,38122,39500,40296,41124,95,334,252,563,993,784,1067,1194,1378,796,828,98,307,314,341,315,341,349,367,359,355,345,72,211,195,222,194,224,260,243,269,289,293,26,96,119,119,121,117,89,124,90,66,52,7,23,15,8,6,13,75,73,106,-2,28,62,217,113,434,857,654,904,1000,1185,739,755,69,240,128,442,863,667,979,1073,1291,737,783,0,-2,5,2,9,0,-1,-3,-3,-7,-7,117,128,149,148,143,114,117,126,151,143,147,147,9.2743640868,9.4026051804,10.088011242,9.1091800292,9.6140291522,9.5893610298,9.780146569,9.2499549097,8.8976891072,8.4745762712,6.3742372062,5.8391974847,6.5675615709,5.6100981767,6.3153739886,7.1439365838,6.4756828781,6.9310247095,7.2434708507,7.1972488332,2.9001268806,3.5634076958,3.5204496709,3.4990818525,3.2986551637,2.445424446,3.3044636909,2.3189302002,1.6542182566,1.277327438,0.6948220651,0.4491690373,0.2366688854,0.173508191,0.3665172404,2.0607509376,1.9453697535,2.731184458,-0.050127826,0.6877916974,6.5554951362,3.3837400809,12.839287035,24.782753286,18.438636556,24.838917968,26.648900733,30.532580969,18.522231691,18.54581184,7.2503172014,3.8329091181,13.07595592,24.956261477,18.805153796,26.899668906,28.594270486,33.263765427,18.472103865,19.233603537 +050,3,5,13,221,Georgia,Oglethorpe County,14899,14874,14891,14700,14500,14415,14532,14722,14710,14851,15034,15222,15383,17,-191,-200,-85,117,190,-12,141,183,188,161,39,156,146,141,169,157,175,136,183,160,146,38,127,123,110,143,151,149,155,159,145,189,1,29,23,31,26,6,26,-19,24,15,-43,1,8,20,5,2,5,-2,-1,1,0,0,17,-229,-248,-122,93,179,-36,160,159,173,205,18,-221,-228,-117,95,184,-38,159,160,173,205,-2,1,5,1,-4,0,0,1,-1,0,-1,177,177,173,177,170,177,177,170,176,177,217,218,10.543746409,10,9.7527234999,11.676512247,10.733574896,11.891818429,9.2013125402,12.246946629,10.576414595,9.5409246855,8.5836909871,8.4246575342,7.608507695,9.8801257471,10.323374581,10.125033977,10.486790027,10.640789694,9.5848757271,12.350923052,1.9600554223,1.5753424658,2.1442158049,1.7963864995,0.4102003145,1.7667844523,-1.285477487,1.6061569349,0.9915388683,-2.809998366,0.5407049441,1.3698630137,0.3458412589,0.1381835769,0.3418335954,-0.135906496,-0.06765671,0.0669232056,0,0,-15.47767902,-16.98630137,-8.438526716,6.425536325,12.237642716,-2.446316934,10.825073577,10.640789694,11.435748281,13.396503839,-14.93697408,-15.61643836,-8.092685457,6.5637199019,12.579476311,-2.58222343,10.757416867,10.707712899,11.435748281,13.396503839 +050,3,5,13,223,Georgia,Paulding County,142324,142385,142826,143606,144750,146775,148562,151691,155415,159642,164482,169302,173359,441,780,1144,2025,1787,3129,3724,4227,4840,4820,4057,508,1866,1885,1850,1856,1851,1958,1909,1918,1976,1887,214,700,713,812,774,882,888,946,1012,1101,1235,294,1166,1172,1038,1082,969,1070,963,906,875,652,20,40,107,90,54,64,136,93,93,32,42,126,-429,-123,902,669,2079,2510,3160,3834,3922,3378,146,-389,-16,992,723,2143,2646,3253,3927,3954,3420,1,3,-12,-5,-18,17,8,11,7,-9,-15,662,659,636,624,545,500,374,461,474,472,530,529,13.029270473,13.074116717,12.691878913,12.568692714,12.329602036,12.751297598,12.11844206,11.834976737,11.83999233,11.013800812,4.8877220422,4.9452759783,5.5707057714,5.241469914,5.8750453784,5.7830195437,6.0052625398,6.2445237008,6.5970807468,7.2082904095,8.1415484303,8.1288407385,7.1211731412,7.3272227997,6.4545566572,6.9682780538,6.1131795199,5.5904530365,5.2429115835,3.8055104024,0.2792984024,0.7421381903,0.6174427579,0.3656839475,0.4263071476,0.8856876779,0.5903693617,0.5738544508,0.1917407665,0.2451402406,-2.995475366,-0.853112125,6.1881485293,4.5304177939,13.848321249,16.346147584,20.059862184,23.657612519,23.500227692,19.716279355,-2.716176963,-0.110973935,6.8055912872,4.8961017414,14.274628397,17.231835262,20.650231545,24.231466969,23.691968459,19.961419595 +050,3,5,13,225,Georgia,Peach County,27695,28054,28104,28031,28012,27411,27391,27216,27111,27179,27574,27697,27950,50,-73,-19,-601,-20,-175,-105,68,395,123,253,81,317,314,292,298,305,287,274,313,308,333,29,236,234,238,229,243,282,282,279,297,302,52,81,80,54,69,62,5,-8,34,11,31,0,8,31,26,19,32,25,4,0,-3,1,1,-162,-128,-707,-105,-274,-135,73,358,116,221,1,-154,-97,-681,-86,-242,-110,77,358,113,222,-3,0,-2,26,-3,5,0,-1,3,-1,0,2028,2018,2021,2013,1365,1302,948,1044,1251,1445,1440,1440,11.294201479,11.205681352,10.53714162,10.875515492,11.170729027,10.565648757,10.093939952,11.43316348,11.145085126,11.968300178,8.4083014162,8.3507306889,8.5884921423,8.3573592205,8.8999578809,10.381578221,10.388653527,10.191222399,10.747046372,10.854134095,2.8859000623,2.8549506629,1.9486494777,2.5181562717,2.2707711466,0.1840705358,-0.294713575,1.2419410809,0.3980387545,1.1141660826,0.2850271667,1.1062933819,0.9382386374,0.6934053502,1.1720109144,0.9203526791,0.1473567876,0,-0.108556024,0.0359408414,-5.771800125,-4.567921061,-25.51287372,-3.831976935,-10.03534345,-4.969904467,2.6892613741,13.076909028,4.1974995929,7.9429259439,-5.486772958,-3.461627679,-24.57463508,-3.138571585,-8.86333254,-4.049551788,2.8366181617,13.076909028,4.088943569,7.9788667853 +050,3,5,13,227,Georgia,Pickens County,29431,29402,29434,29390,29258,29389,29807,30139,30654,31542,32039,32648,33127,32,-44,-132,131,418,332,515,888,497,609,479,77,308,287,300,293,318,306,311,315,293,301,51,294,293,310,335,285,332,358,342,348,398,26,14,-6,-10,-42,33,-26,-47,-27,-55,-97,3,16,15,16,-1,3,3,0,-1,-2,-1,6,-73,-141,122,448,294,538,930,524,666,581,9,-57,-126,138,447,297,541,930,523,664,580,-3,-1,0,3,13,2,0,5,1,0,-4,360,361,368,354,321,334,337,354,369,398,399,398,10.471916225,9.7872050198,10.230702338,9.8993175215,10.609548594,10.066948497,10.000643128,9.9086204998,9.0590072194,9.152413531,9.9959200326,9.9918155777,10.571725749,11.31833232,9.5085577019,10.922310134,11.51199434,10.757930828,10.759503455,12.10186241,0.475996192,-0.204610558,-0.341023411,-1.419014798,1.1009908918,-0.855361637,-1.511351212,-0.849310329,-1.700496236,-2.949448879,0.543995648,0.5115263948,0.545637458,-0.033786067,0.1000900811,0.0986955735,0,-0.031455938,-0.061836227,-0.030406689,-2.481980144,-4.808348111,4.1604856173,15.136157849,9.8088279452,17.699406182,29.905460158,16.482911562,20.591463509,17.666286583,-1.937984496,-4.296821716,4.7061230753,15.102371782,9.9089180262,17.798101755,29.905460158,16.451455624,20.529627282,17.635879894 +050,3,5,13,229,Georgia,Pierce County,18758,18760,18813,18769,18902,19015,19004,19089,19116,19200,19398,19443,19522,53,-44,133,113,-11,85,27,84,198,45,79,55,241,226,259,212,235,263,242,255,246,250,37,196,179,202,211,198,200,214,197,235,253,18,45,47,57,1,37,63,28,58,11,-3,1,2,10,0,-6,-8,-3,-4,-4,-5,-4,33,-91,77,57,-2,59,-33,62,142,40,84,34,-89,87,57,-8,51,-36,58,138,35,80,1,0,-1,-1,-4,-3,0,-2,2,-1,2,142,145,143,150,178,184,188,126,94,74,149,149,12.825288702,11.998619628,13.661418361,11.152318578,12.338224871,13.767831436,12.631798726,13.213119851,12.667027111,12.832028744,10.430525251,9.5033314751,10.654851386,11.099713301,10.395610742,10.469833791,11.170268295,10.207782787,12.100615329,12.986013089,2.3947634506,2.4952881527,3.0065669752,0.0526052763,1.9426141286,3.2979976443,1.4615304312,3.0053370641,0.5664117814,-0.153984345,0.1064339311,0.5309123729,0,-0.315631658,-0.420024676,-0.157047507,-0.208790062,-0.207264625,-0.257459901,-0.20531246,-4.842743867,4.0880252714,3.0065669752,-0.105210553,3.0976819888,-1.727522576,3.2362459547,7.3578941914,2.059679205,4.3115616579,-4.736309936,4.6189376443,3.0065669752,-0.42084221,2.6776573124,-1.884570082,3.0274558931,7.1506295663,1.8022193043,4.106249198 +050,3,5,13,231,Georgia,Pike County,17869,17879,17929,17792,17780,17784,17774,17935,17916,18213,18622,18953,19121,50,-137,-12,4,-10,161,-19,297,409,331,168,41,167,155,175,145,151,167,191,168,212,209,19,148,169,178,156,177,168,186,184,188,217,22,19,-14,-3,-11,-26,-1,5,-16,24,-8,0,0,3,2,0,3,3,2,2,2,1,30,-156,1,4,6,184,-18,290,424,307,176,30,-156,4,6,6,187,-15,292,426,309,177,-2,0,-2,1,-5,0,-3,0,-1,-2,-1,268,270,272,272,212,224,213,212,229,209,257,257,9.3502421545,8.7147194423,9.8414126645,8.1556892964,8.4572516732,9.3163370617,10.573223726,9.1217591964,11.28409847,10.978620581,8.2864421489,9.5018553919,10.010122596,8.7743967602,9.9134671931,9.3721235112,10.296437765,9.9904981675,10.00665336,11.398854862,1.0638000056,-0.78713595,-0.168709931,-0.618707464,-1.45621552,-0.055786449,0.2767859614,-0.868738971,1.2774451098,-0.420234281,0,0.1686719892,0.1124732876,0,0.1680248677,0.1673593484,0.1107143846,0.1085923714,0.1064537591,0.0525292851,-8.734357941,0.0562239964,0.2249465752,0.3374767985,10.305525218,-1.00415609,16.053585762,23.021582734,16.340652029,9.2451541735,-8.734357941,0.2248959856,0.3374198628,0.3374767985,10.473550085,-0.836796742,16.164300147,23.130175105,16.447105788,9.2976834585 +050,3,5,13,233,Georgia,Polk County,41475,41487,41537,41277,41097,40972,40876,41209,41584,41842,42373,42616,42840,50,-260,-180,-125,-96,333,375,258,531,243,224,148,601,562,546,561,542,574,565,556,549,574,86,461,451,467,484,457,483,527,479,518,557,62,140,111,79,77,85,91,38,77,31,17,14,42,47,62,16,-5,17,8,5,4,7,-21,-444,-342,-266,-182,255,266,211,449,207,199,-7,-402,-295,-204,-166,250,283,219,454,211,206,-5,2,4,0,-7,-2,1,1,0,1,1,373,374,357,365,293,352,368,612,624,637,386,386,14.514454078,13.645082186,13.305876762,13.708337406,13.205823232,13.865906538,13.544938029,13.204298522,12.919318971,13.433813893,11.133383244,10.950057057,11.380667487,11.826800899,11.134799293,11.667653062,12.633951046,11.375645669,12.189812799,13.035948324,3.3810708334,2.6950251293,1.9252092751,1.8815365067,2.0710239386,2.1982534755,0.9109869825,1.8286528528,0.7295061714,0.3978655682,1.01432125,1.1411367665,1.5109237349,0.3909686248,-0.121824938,0.4106627372,0.1917867332,0.1187436917,0.0941298286,0.1638269987,-10.72282464,-8.303590939,-6.482350217,-4.447268107,6.2130718158,6.4256640054,5.0583750869,10.663183518,4.8712186283,4.6573675342,-9.708503393,-7.162454172,-4.971426483,-4.056299482,6.0912468782,6.8363267426,5.2501618201,10.78192721,4.9653484569,4.8211945329 +050,3,5,13,235,Georgia,Pulaski County,12010,12014,11989,11855,11716,11578,11520,11409,11296,11197,11079,11161,11191,-25,-134,-139,-138,-58,-111,-113,-99,-118,82,30,29,87,97,94,79,102,79,87,96,88,102,10,117,97,114,105,117,118,125,100,90,145,19,-30,0,-20,-26,-15,-39,-38,-4,-2,-43,0,-2,-3,-4,-4,-2,-1,0,0,0,0,-46,-103,-139,-117,-24,-95,-73,-62,-114,84,72,-46,-105,-142,-121,-28,-97,-74,-62,-114,84,72,2,1,3,3,-4,1,0,1,0,0,1,1248,1224,1188,1249,1246,1221,1209,1193,1196,1176,1238,1237,7.2974333166,8.2304526749,8.0707478321,6.8404190839,8.8970299621,6.9588196433,7.735740008,8.6191416771,7.9136690647,9.1267000716,9.8137896326,8.2304526749,9.7879282219,9.0916962508,10.205416721,10.394186303,11.114568977,8.9782725804,8.0935251799,12.974230494,-2.516356316,0,-1.71718039,-2.251277167,-1.308386759,-3.435366659,-3.378828969,-0.359130903,-0.179856115,-3.847530422,-0.167757088,-0.254550083,-0.343436078,-0.346350333,-0.174451568,-0.088086325,0,0,0,0,-8.639490018,-11.79415383,-10.04550528,-2.078102,-8.286449474,-6.430301696,-5.512826213,-10.23523074,7.5539568345,6.4423765211,-8.807247106,-12.04870392,-10.38894136,-2.424452334,-8.460901042,-6.51838802,-5.512826213,-10.23523074,7.5539568345,6.4423765211 +050,3,5,13,237,Georgia,Putnam County,21218,21218,21192,21242,21135,21280,21142,21310,21502,21676,21749,22083,22520,-26,50,-107,145,-138,168,192,174,73,334,437,48,267,259,231,229,234,230,215,224,232,230,73,218,211,244,228,238,255,235,253,236,307,-25,49,48,-13,1,-4,-25,-20,-29,-4,-77,-2,-2,0,2,6,11,4,1,-1,1,2,4,5,-158,154,-146,161,213,195,103,336,515,2,3,-158,156,-140,172,217,196,102,337,517,-3,-2,3,2,1,0,0,-2,0,1,-3,172,172,171,184,171,161,172,171,171,159,157,157,12.58424848,12.223611865,10.892372981,10.796284946,11.024215585,10.744651032,9.9587753022,10.316637881,10.585873335,10.313207632,10.274779658,9.9582320598,11.505363669,10.749139597,11.212663714,11.912547884,10.885173005,11.652274036,10.768388392,13.765890187,2.3094688222,2.2653798051,-0.612990687,0.0471453491,-0.18844813,-1.167896851,-0.926397703,-1.335636154,-0.182515057,-3.452682555,-0.094264034,0,0.0943062596,0.2828720947,0.5182323565,0.1868634962,0.0463198851,-0.046056419,0.0456287644,0.0896800664,0.2356600839,-7.456875192,7.2615819875,-6.88322097,7.5850372185,9.9504811735,9.0323775997,4.7438111687,15.331264829,23.092617089,0.1413960503,-7.456875192,7.3558882471,-6.600348876,8.103269575,10.13734467,9.0786974848,4.6977547496,15.376893594,23.182297155 +050,3,5,13,239,Georgia,Quitman County,2513,2510,2512,2454,2407,2368,2287,2277,2323,2334,2254,2300,2271,2,-58,-47,-39,-81,-10,46,11,-80,46,-29,8,26,26,23,19,21,30,20,31,17,18,13,21,41,24,39,28,26,24,45,30,39,-5,5,-15,-1,-20,-7,4,-4,-14,-13,-21,0,0,0,0,0,0,0,0,0,0,0,7,-62,-33,-39,-63,-2,42,14,-65,60,-7,7,-62,-33,-39,-63,-2,42,14,-65,60,-7,0,-1,1,1,2,-1,0,1,-1,-1,-1,0,0,0,0,0,0,0,0,0,0,0,0,10.471204188,10.697387369,9.6335078534,8.1632653061,9.2024539877,13.043478261,8.5892205282,13.513513514,7.4659639877,7.8757383505,8.4575110753,16.868957005,10.052356021,16.756176155,12.26993865,11.304347826,10.307064634,19.616390584,13.175230567,17.064099759,2.0136931132,-6.171569636,-0.418848168,-8.592910849,-3.067484663,1.7391304348,-1.717844106,-6.102877071,-5.709266579,-9.188361409,0,0,0,0,0,0,0,0,0,0,-24.9697946,-13.5774532,-16.33507853,-27.06766917,-0.876424189,18.260869565,6.0124543698,-28.3347864,26.350461133,-3.062787136,-24.9697946,-13.5774532,-16.33507853,-27.06766917,-0.876424189,18.260869565,6.0124543698,-28.3347864,26.350461133,-3.062787136 +050,3,5,13,241,Georgia,Rabun County,16276,16273,16276,16257,16303,16184,16159,16224,16493,16560,16853,17116,17273,3,-19,46,-119,-25,65,269,67,293,263,157,44,137,157,129,151,148,171,155,147,144,154,33,169,177,204,206,211,231,213,197,214,254,11,-32,-20,-75,-55,-63,-60,-58,-50,-70,-100,-1,2,7,12,7,10,17,8,6,4,4,-5,12,61,-53,27,117,312,119,337,330,253,-6,14,68,-41,34,127,329,127,343,334,257,-2,-1,-2,-3,-4,1,0,-2,0,-1,0,390,390,389,393,389,391,391,406,414,490,447,448,8.4222174408,9.6437346437,7.9416381937,9.3374145874,9.1405984622,10.453281169,9.3788763501,8.7989704606,8.4783184668,8.956352322,10.389450712,10.872235872,12.558869702,12.738459636,13.031528889,14.121099123,12.888391371,11.791817556,12.599723277,14.772165518,-1.967233271,-1.228501229,-4.617231508,-3.401045048,-3.890930426,-3.667817954,-3.509515021,-2.992847095,-4.12140481,-5.815813196,0.1229520794,0.42997543,0.7387570413,0.4328602789,0.6176080042,1.039215087,0.4840710374,0.3591416515,0.2355088463,0.2326325278,0.7377124766,3.7469287469,-3.262843599,1.6696039328,7.2260136491,19.072653361,7.2005566817,20.171789423,19.42947982,14.714007386,0.860664556,4.1769041769,-2.524086558,2.1024642117,7.8436216533,20.111868448,7.6846277191,20.530931075,19.664988666,14.946639914 +050,3,5,13,243,Georgia,Randolph County,7719,7721,7668,7570,7310,7202,7315,7153,7150,6974,6826,6806,6682,-53,-98,-260,-108,113,-162,-3,-176,-148,-20,-124,18,106,81,95,80,80,67,80,70,61,58,41,85,96,88,91,90,90,97,87,83,83,-23,21,-15,7,-11,-10,-23,-17,-17,-22,-25,0,1,-1,0,0,0,0,0,0,0,0,-32,-120,-253,-117,118,-153,21,-158,-132,2,-97,-32,-119,-254,-117,118,-153,21,-158,-132,2,-97,2,0,9,2,6,1,-1,-1,1,0,-2,308,306,304,302,298,437,353,351,372,311,353,350,13.912586954,10.887096774,13.09261301,11.021560929,11.058888582,9.3686639167,11.328235627,10.144927536,8.9495305164,8.6002372479,11.156319727,12.903225806,12.127894157,12.537025556,12.441249654,12.584772425,13.735485698,12.608695652,12.177230047,12.307236062,2.7562672267,-2.016129032,0.9647188534,-1.515464628,-1.382361073,-3.216108509,-2.407250071,-2.463768116,-3.227699531,-3.706998814,0.1312508203,-0.134408602,0,0,0,0,0,0,0,0,-15.75009844,-34.00537634,-16.12458655,16.25680237,-21.15012441,2.9364468993,-22.37326536,-19.13043478,0.29342723,-14.3831554,-15.61884762,-34.13978495,-16.12458655,16.25680237,-21.15012441,2.9364468993,-22.37326536,-19.13043478,0.29342723,-14.3831554 +050,3,5,13,245,Georgia,Richmond County,200549,200591,201122,200618,201827,201457,201448,201639,202179,201965,202027,202639,202079,531,-504,1209,-370,-9,191,540,-214,62,612,-560,689,3016,3024,3017,2964,2936,2919,2821,2902,2808,2817,467,1901,1850,1890,1947,1884,2003,1940,2009,2109,2254,222,1115,1174,1127,1017,1052,916,881,893,699,563,142,190,692,465,301,456,373,227,143,123,125,180,-1815,-627,-1985,-1293,-1304,-739,-1317,-967,-216,-1250,322,-1625,65,-1520,-992,-848,-366,-1090,-824,-93,-1125,-13,6,-30,23,-34,-13,-10,-5,-7,6,2,10508,10762,10768,10603,10783,11349,11377,11629,11702,11835,12826,12830,15.014686115,15.028140491,14.962160661,14.713145779,14.567574742,14.45700786,13.960370561,14.366621121,13.878111826,13.920804115,9.4638323294,9.1938028799,9.3730472818,9.6648093223,9.3478579066,9.920310635,9.6005384219,9.9457414998,10.423410912,11.138619977,5.550853786,5.8343376114,5.5891133792,5.0483364565,5.2197168353,4.536697225,4.359832139,4.4208796214,3.4547009138,2.7821841381,0.9458853985,3.4389792394,2.3060671884,1.4941487447,2.2625388564,1.8473668831,1.12336197,0.7079348106,0.6079087445,0.6177140626,-9.035694728,-3.115953733,-9.844179288,-6.418386468,-6.470067256,-3.660064683,-6.517478918,-4.787223509,-1.067547064,-6.177140626,-8.089809329,0.3230255066,-7.5381121,-4.924237724,-4.2075284,-1.8126978,-5.394116948,-4.079288699,-0.459638319,-5.559426564 +050,3,5,13,247,Georgia,Rockdale County,85215,85173,85359,85423,85453,86522,87222,88424,88995,89800,90402,90639,90939,186,64,30,1069,700,1202,571,805,602,237,300,233,1065,995,938,990,1001,1023,961,977,954,954,96,583,573,678,637,631,698,712,745,827,805,137,482,422,260,353,370,325,249,232,127,149,12,27,73,126,38,88,43,20,7,-3,6,38,-447,-493,685,328,750,208,544,369,111,141,50,-420,-420,811,366,838,251,564,376,108,147,-1,2,28,-2,-19,-6,-5,-8,-6,2,4,864,871,878,852,728,789,793,817,831,759,765,766,12.472040379,11.64587186,10.908562291,11.396076987,11.397925373,11.532023064,10.749741324,10.843386866,10.539049166,10.507880911,6.8274174093,6.7066176643,7.8848669865,7.3326273137,7.1849060041,7.8683793731,7.9644285355,8.2684986848,9.1360520545,8.8667129278,5.6446229696,4.939254196,3.0236953046,4.0634496731,4.2130193685,3.6636436909,2.7853127884,2.574888181,1.4029971112,1.6411679829,0.316192573,0.8544207495,1.465329263,0.4374251773,1.0020154174,0.4847282422,0.2237199027,0.0776905917,-0.033141664,0.0660873013,-5.234743708,-5.770266158,7.9662741678,3.7756699512,8.5399041253,2.3447319622,6.0851813529,4.0954040466,1.2262415696,1.5530515811,-4.918551135,-4.915845408,9.4316034307,4.2130951285,9.5419195427,2.8294602044,6.3089012556,4.1730946382,1.1930999055,1.6191388825 +050,3,5,13,249,Georgia,Schley County,5010,5013,5020,5043,5023,5095,5189,5208,5179,5236,5212,5254,5196,7,23,-20,72,94,19,-29,57,-24,42,-58,12,62,48,48,49,41,56,54,46,52,50,1,30,40,42,31,48,33,43,36,27,45,11,32,8,6,18,-7,23,11,10,25,5,0,-1,0,0,0,15,19,12,12,12,10,-3,-9,-29,67,74,11,-69,34,-46,5,-75,-3,-10,-29,67,74,26,-50,46,-34,17,-65,-1,1,1,-1,2,0,-2,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,12.322369075,9.5370554341,9.4880411148,9.5293660054,7.8868904492,10.782709156,10.369659145,8.8055130168,9.9369386585,9.5693779904,5.9624366491,7.9475461951,8.3020359755,6.0287825749,9.233432721,6.3540964667,8.2573211714,6.8912710567,5.1595643035,8.6124401914,6.3599324257,1.589509239,1.1860051394,3.5005834306,-1.346542272,4.4286126889,2.1123379741,1.9142419602,4.7773743551,0.956937799,-0.198747888,0,0,0,2.8854477253,3.6584191778,2.304368699,2.2970903522,2.2931396904,1.9138755981,-1.788730995,-5.761970991,13.243724056,14.391287437,2.1159949986,-13.28583807,6.5290446471,-8.805513017,0.955474871,-14.35406699,-1.987478883,-5.761970991,13.243724056,14.391287437,5.0014427239,-9.627418889,8.8334133461,-6.508422665,3.2486145614,-12.44019139 +050,3,5,13,251,Georgia,Screven County,14593,14592,14499,14403,14170,14145,14001,14060,14015,13953,13960,13945,14012,-93,-96,-233,-25,-144,59,-45,-62,7,-15,67,50,216,196,179,184,161,181,171,201,172,175,56,183,175,162,197,167,167,153,164,176,190,-6,33,21,17,-13,-6,14,18,37,-4,-15,0,3,3,4,3,3,2,1,1,1,1,-90,-132,-267,-42,-137,61,-59,-81,-31,-10,79,-90,-129,-264,-38,-134,64,-57,-80,-30,-9,80,3,0,10,-4,3,1,-2,0,0,-2,2,420,434,459,400,368,356,440,441,441,442,479,479,14.947062487,13.719245442,12.64347519,13.074682015,11.475000891,12.894033838,12.22826087,14.401891592,12.327539867,12.519225954,12.663483496,12.249326287,11.442698216,13.998436723,11.902640676,11.896705254,10.941075515,11.75079712,12.614226841,13.592302464,2.2835789911,1.4699191544,1.2007769733,-0.923754708,-0.427639785,0.9973285841,1.2871853547,2.6510944721,-0.286686974,-1.07307651,0.2075980901,0.2099884506,0.2825357584,0.2131741633,0.2138198924,0.142475512,0.0715102975,0.0716512019,0.0716717434,0.071538434,-9.134315964,-18.68897211,-2.966625464,-9.734953457,4.347671145,-4.203027605,-5.792334096,-2.22118726,-0.716717434,5.6515362879,-8.926717874,-18.47898366,-2.684089705,-9.521779294,4.5614910374,-4.060552093,-5.720823799,-2.149536058,-0.645045691,5.7230747219 +050,3,5,13,253,Georgia,Seminole County,8729,8729,8727,8766,8869,8844,8596,8559,8424,8249,8266,8090,8060,-2,39,103,-25,-248,-37,-135,-175,17,-176,-30,19,119,103,98,106,91,88,94,94,86,86,14,116,105,121,117,133,132,143,133,114,115,5,3,-2,-23,-11,-42,-44,-49,-39,-28,-29,0,0,-1,-1,0,0,0,0,0,0,0,-6,36,104,0,-241,4,-89,-127,56,-147,0,-6,36,103,-1,-241,4,-89,-127,56,-147,0,-1,0,2,-1,4,1,-2,1,0,-1,-1,100,100,103,100,103,100,75,99,81,97,53,52,13.605442177,11.681315566,11.065319257,12.155963303,10.609151851,10.363304481,11.275715228,11.383590675,10.516018586,10.650154799,13.262447836,11.908137227,13.66228194,13.417431193,15.505683474,15.544956721,17.153481677,16.106569785,13.939838591,14.241486068,0.3429943406,-0.226821661,-2.596962683,-1.26146789,-4.896531623,-5.18165224,-5.877766449,-4.72297911,-3.423820005,-3.591331269,0,-0.113410831,-0.112911421,0,0,0,0,0,0,0,4.1159320871,11.794726396,0,-27.63761468,0.4663363451,-10.4810693,-15.234211,6.7817135937,-17.97505503,0,4.1159320871,11.681315566,-0.112911421,-27.63761468,0.4663363451,-10.4810693,-15.234211,6.7817135937,-17.97505503,0 +050,3,5,13,255,Georgia,Spalding County,64073,64107,64096,64045,63693,63521,63703,63826,64523,65348,66092,66835,67414,-11,-51,-352,-172,182,123,697,825,744,743,579,228,909,830,813,832,829,792,798,866,869,848,190,678,677,706,718,749,759,752,836,757,872,38,231,153,107,114,80,33,46,30,112,-24,10,22,34,21,8,9,4,-1,-7,-6,-4,-58,-304,-548,-298,75,42,655,777,723,637,607,-48,-282,-514,-277,83,51,659,776,716,631,603,-1,0,9,-2,-15,-8,5,3,-2,0,0,1226,1241,1282,1201,1194,1147,1184,1216,1230,1357,1379,1379,14.187496586,12.995349857,12.781612087,13.079293215,13.000964487,12.341350536,12.289117663,13.177115033,13.074845592,12.633241216,10.582093163,10.59982151,11.099407298,11.28717852,11.746347889,11.827127597,11.580722409,12.720632988,11.389710142,12.990785779,3.6054034228,2.3955283471,1.6822047888,1.7921146953,1.254616597,0.514222939,0.7083952538,0.456482045,1.6851354503,-0.357544563,0.3433717546,0.5323396327,0.3301523417,0.1257624348,0.1411443672,0.0623300532,-0.015399897,-0.106512477,-0.090275113,-0.05959076,-4.744773336,-8.580062315,-4.685018944,1.1790228259,0.6586737134,10.206546214,11.96571983,11.001217285,9.5842078735,9.0428978987,-4.401401581,-8.047722682,-4.354866603,1.3047852606,0.7998180806,10.268876267,11.950319933,10.894704808,9.4939327601,8.9833071382 +050,3,5,13,257,Georgia,Stephens County,26175,26162,26124,25763,25721,25571,25429,25475,25680,25785,26083,26017,26107,-38,-361,-42,-150,-142,46,205,105,298,-66,90,65,307,311,311,305,304,327,285,336,295,311,92,324,349,373,292,337,365,346,372,384,385,-27,-17,-38,-62,13,-33,-38,-61,-36,-89,-74,4,10,-8,4,-1,3,18,6,1,1,3,-11,-357,9,-91,-153,78,226,160,333,22,162,-7,-347,1,-87,-154,81,244,166,334,23,165,-4,3,-5,-1,-1,-2,-1,0,0,0,-1,548,549,552,559,573,584,586,597,573,773,567,567,11.833407212,12.081423355,12.12664743,11.960784314,11.944051548,12.78467403,11.075488196,12.955965142,11.3243762,11.933082649,12.488677318,13.557610131,14.544178429,11.450980392,13.240609775,14.270354804,13.446031283,14.344104265,14.740882917,14.772465659,-0.655270106,-1.476186776,-2.417530999,0.5098039216,-1.296558227,-1.485680774,-2.370543088,-1.388139122,-3.416506718,-2.83938301,0.3854530036,-0.310776163,0.1559697419,-0.039215686,0.1178689298,0.7037435246,0.2331681725,0.0385594201,0.0383877159,0.115110122,-13.76067223,0.3496231839,-3.548311628,-6,3.0645921735,8.8358909198,6.2178179345,12.840286882,0.8445297505,6.2159465889,-13.37521923,0.0388470204,-3.392341886,-6.039215686,3.1824611033,9.5396344443,6.4509861071,12.878846302,0.8829174664,6.3310567109 +050,3,5,13,259,Georgia,Stewart County,6058,6060,6099,6065,6106,5555,5882,5969,6129,6329,6434,6649,6689,39,-34,41,-551,327,87,160,200,105,215,40,11,64,45,41,46,52,35,46,33,35,40,25,66,69,65,76,69,66,61,73,45,70,-14,-2,-24,-24,-30,-17,-31,-15,-40,-10,-30,2,18,40,95,111,187,275,192,174,178,141,44,-50,24,-649,233,-84,-85,24,-28,47,-72,46,-32,64,-554,344,103,190,216,146,225,69,7,0,1,27,13,1,1,-1,-1,0,1,1675,1735,1778,1826,1226,1516,1536,1543,1559,1644,1702,1699,10.522854324,7.3946265714,7.0319869651,8.0440675002,8.7756307485,5.7860803439,7.3848129716,5.1711979942,5.3504547887,5.9979007347,10.851693522,11.338427409,11.148272018,13.290198479,11.644586955,10.910894363,9.792904158,11.439316775,6.8791561568,10.496326286,-0.328839198,-3.943800838,-4.116285053,-5.246130978,-2.868956206,-5.124814019,-2.408091186,-6.268118781,-1.528701368,-4.498425551,2.9595527787,6.5730013968,16.293628334,19.41068462,31.558518269,45.462059845,30.823567186,27.266316697,27.210884354,21.14260009,-8.220979941,3.9438008381,-111.3112083,40.744950599,-14.1760189,-14.05190941,3.8529458982,-4.387683147,7.1848964305,-10.79622132,-5.261427162,10.516802235,-95.01757997,60.155635219,17.382499367,31.410150438,34.676513084,22.87863355,34.395780784,10.346378767 +050,3,5,13,261,Georgia,Sumter County,32819,32742,32608,31993,31509,31265,31089,30625,30334,29838,29713,29401,29282,-134,-615,-484,-244,-176,-464,-291,-496,-125,-312,-119,115,420,460,384,376,372,377,391,382,345,338,124,335,356,305,311,341,372,385,414,354,363,-9,85,104,79,65,31,5,6,-32,-9,-25,0,3,10,6,6,29,61,34,23,22,18,-131,-710,-614,-329,-252,-530,-359,-536,-115,-325,-113,-131,-707,-604,-323,-246,-501,-298,-502,-92,-303,-95,6,7,16,0,5,6,2,0,-1,0,1,1834,1757,1659,1675,1555,1659,1601,1573,1583,1529,1608,1604,13.002894692,14.48773267,12.234364546,12.060172563,12.055611369,12.368969307,12.99607791,12.829339558,11.672361877,11.519520134,10.371356481,11.212245284,9.7173989231,9.9753023062,11.050977088,12.204924621,12.796649604,13.904048631,11.976858274,12.371555646,2.6315382115,3.2754873862,2.5169656227,2.0848702569,1.0046342807,0.1640446858,0.1994283055,-1.074709073,-0.304496397,-0.852035513,0.0928778192,0.3149507102,0.191161946,0.1924495622,0.9398191658,2.0013451664,1.1300937313,0.7724471461,0.7443245255,0.6134655692,-21.98108388,-19.33797361,-10.48204671,-8.082881611,-17.17600544,-11.77840844,-17.81559529,-3.862235731,-10.99570322,-3.851200518,-21.88820606,-19.0230229,-10.29088476,-7.890432049,-16.23618628,-9.777063272,-16.68550156,-3.089788585,-10.25137869,-3.237734949 +050,3,5,13,263,Georgia,Talbot County,6865,6892,6883,6854,6643,6556,6535,6499,6361,6254,6281,6188,6143,-9,-29,-211,-87,-21,-36,-138,-107,27,-93,-45,12,70,68,46,61,50,39,62,50,58,56,6,71,78,81,75,91,79,90,79,81,101,6,-1,-10,-35,-14,-41,-40,-28,-29,-23,-45,0,0,0,0,0,0,0,0,0,0,0,-15,-28,-209,-51,-6,7,-98,-80,57,-72,2,-15,-28,-209,-51,-6,7,-98,-80,57,-72,2,0,0,8,-1,-1,-2,0,1,-1,2,-2,17,17,17,15,16,17,17,0,0,0,0,0,10.191453738,10.076313255,6.970225017,9.3193797265,7.6722418291,6.065318818,9.8295679746,7.9776625449,9.3030716176,9.0827994485,10.337045934,11.558124028,12.273657095,11.458253762,13.963480129,12.286158631,14.268727705,12.604706821,12.992220707,16.381477577,-0.145592196,-1.481810773,-5.303432078,-2.138874036,-6.2912383,-6.220839813,-4.43915973,-4.627044276,-3.68914909,-7.298678128,0,0,0,0,0,0,0,0,0,0,-4.076581495,-30.96984515,-7.727858171,-0.916660301,1.0741138561,-15.24105754,-12.68331352,9.0945353012,-11.54864063,0.3243856946,-4.076581495,-30.96984515,-7.727858171,-0.916660301,1.0741138561,-15.24105754,-12.68331352,9.0945353012,-11.54864063,0.3243856946 +050,3,5,13,265,Georgia,Taliaferro County,1717,1717,1703,1705,1673,1687,1691,1641,1616,1612,1610,1549,1562,-14,2,-32,14,4,-50,-25,-4,-2,-61,13,3,16,11,21,16,13,20,6,16,13,13,2,29,24,21,23,26,29,16,24,20,30,1,-13,-13,0,-7,-13,-9,-10,-8,-7,-17,0,0,0,3,0,1,2,1,1,0,1,-15,15,-19,12,11,-39,-18,4,5,-53,29,-15,15,-19,15,11,-38,-16,5,6,-53,30,0,0,0,-1,0,1,0,1,0,-1,0,7,7,7,7,7,7,7,7,7,7,7,7,9.3896713615,6.5127294257,12.5,9.4730609828,7.8031212485,12.281240405,3.717472119,9.9317194289,8.2304526749,8.3574413372,17.018779343,14.209591474,12.5,13.617525163,15.606242497,17.807798588,9.9132589839,14.897579143,12.662234884,19.286403086,-7.629107981,-7.696862049,0,-4.14446418,-7.803121248,-5.526558182,-6.195786865,-4.965859714,-4.43178221,-10.92896175,0,0,1.7857142857,0,0.600240096,1.2281240405,0.6195786865,0.6207324643,0,0.6428801029,8.8028169014,-11.24925992,7.1428571429,6.5127294257,-23.40936375,-11.05311636,2.478314746,3.1036623215,-33.55492244,18.643522983,8.8028169014,-11.24925992,8.9285714286,6.5127294257,-22.80912365,-9.824992324,3.0978934325,3.7243947858,-33.55492244,19.286403086 +050,3,5,13,267,Georgia,Tattnall County,25520,25504,25470,25435,25457,25632,25319,25394,25352,25420,25508,25317,25365,-34,-35,22,175,-313,75,-42,68,88,-191,48,81,341,350,315,252,258,265,255,241,243,247,71,230,232,204,221,265,242,259,251,227,280,10,111,118,111,31,-7,23,-4,-10,16,-33,2,7,12,6,-1,49,86,75,92,36,40,-51,-153,-108,56,-353,35,-151,-1,6,-244,39,-49,-146,-96,62,-354,84,-65,74,98,-208,79,5,0,0,2,10,-2,0,-2,0,1,2,4859,4789,4745,4776,4780,4516,4581,4552,4544,4676,4453,4446,13.397505157,13.754617622,12.331421637,9.8918568821,10.174905843,10.44417294,10.044906641,9.4643418159,9.5622233153,9.7470502348,9.0364404282,9.1173465378,7.9860635362,8.675001472,10.45096918,9.5376975525,10.202473804,9.8570530946,8.9326119036,11.049287716,4.3610647284,4.6372710839,4.3453581006,1.2168554101,-0.276063337,0.9064753872,-0.157567163,-0.392711279,0.6296114117,-1.302237481,0.2750221,0.4715868899,0.2348842217,-0.0392534,1.9324433577,3.3894297087,2.9543843063,3.6129437637,1.4166256763,1.5784696737,-6.011197328,-4.244282009,2.1922527354,-13.85645032,1.3803166841,-5.951207977,-0.039391791,0.2356267672,-9.601574029,1.5390079318,-5.736175228,-3.772695119,2.4271369571,-13.89570372,3.3127600418,-2.561778268,2.9149925156,3.8485705309,-8.184948352,3.1174776055 +050,3,5,13,269,Georgia,Taylor County,8906,8982,8853,8513,8434,8456,8453,8316,8256,8181,8067,8051,8074,-129,-340,-79,22,-3,-137,-60,-75,-114,-16,23,22,82,94,87,94,87,75,94,73,94,84,48,100,82,95,104,100,100,109,108,85,88,-26,-18,12,-8,-10,-13,-25,-15,-35,9,-4,0,-1,0,1,0,0,0,-3,-2,-2,0,-115,-325,-92,27,6,-126,-34,-57,-78,-23,29,-115,-326,-92,28,6,-126,-34,-60,-80,-25,29,12,4,1,2,1,2,-1,0,1,0,-2,395,298,178,160,209,223,218,238,218,226,215,214,9.4437406426,11.093408863,10.301953819,11.118339346,10.376289582,9.0514120203,11.43761027,8.9857213195,11.663978161,10.418604651,11.516756881,9.6772290081,11.249259917,12.301141404,11.926769634,12.06854936,13.262760844,13.29394387,10.547214295,10.914728682,-2.073016239,1.4161798548,-0.947306098,-1.182802058,-1.550480052,-3.01713734,-1.825150575,-4.30822255,1.1167638665,-0.496124031,-0.115167569,0,0.1184132623,0,0,0,-0.365030115,-0.246184146,-0.248169748,0,-37.42945986,-10.85737889,3.1971580817,0.7096812348,-15.02772974,-4.103306783,-6.935572185,-9.601181684,-2.853952103,3.5968992248,-37.54462743,-10.85737889,3.315571344,0.7096812348,-15.02772974,-4.103306783,-7.3006023,-9.84736583,-3.102121851,3.5968992248 +050,3,5,13,271,Georgia,Telfair County,16500,16492,16519,16242,16364,16624,16448,16448,15960,15912,15888,15813,15781,27,-277,122,260,-176,0,-488,-48,-24,-75,-32,35,158,117,128,134,133,132,129,137,125,124,16,144,154,147,154,151,141,166,166,112,178,19,14,-37,-19,-20,-18,-9,-37,-29,13,-54,5,0,36,39,15,67,89,55,49,50,39,4,-293,117,231,-173,-49,-573,-64,-43,-138,-19,9,-293,153,270,-158,18,-484,-9,6,-88,20,-1,2,6,9,2,0,5,-2,-1,0,2,3127,3151,3157,3428,3775,3831,3715,3186,3289,3215,3139,3133,9.6456152132,7.176593265,7.7603977204,8.1035316884,8.0860894942,8.1461367564,8.0948795181,8.6163522013,7.8861865556,7.8495916946,8.7909404475,9.4461142121,8.912331757,9.31301403,9.1804474708,8.7015551716,10.416666667,10.440251572,7.0660231538,11.267962271,0.8546747657,-2.269520947,-1.151934037,-1.209482342,-1.094357977,-0.555418415,-2.321787149,-1.823899371,0.8201634018,-3.418370577,0,2.2081825431,2.3644961804,0.9071117562,4.0734435798,5.4924709948,3.4513052209,3.0817610063,3.1544746223,2.4688231943,-17.88712188,7.176593265,14.005092761,-10.46202225,-2.979085603,-35.3616391,-4.016064257,-2.704402516,-8.706349957,-1.202760018,-17.88712188,9.3847758081,16.369588941,-9.554910498,1.0943579767,-29.86916811,-0.564759036,0.3773584906,-5.551875335,1.2660631766 +050,3,5,13,273,Georgia,Terrell County,9315,9507,9525,9390,9225,9167,9081,9016,8873,8698,8601,8573,8523,18,-135,-165,-58,-86,-65,-143,-175,-97,-28,-50,29,127,139,143,121,105,116,93,98,107,107,7,104,99,108,105,105,113,104,129,114,109,22,23,40,35,16,0,3,-11,-31,-7,-2,0,0,0,0,0,0,0,0,0,0,0,-3,-160,-211,-93,-103,-64,-147,-164,-67,-21,-48,-3,-160,-211,-93,-103,-64,-147,-164,-67,-21,-48,-1,2,6,0,1,-1,1,0,1,0,0,270,270,276,269,270,270,268,269,269,271,268,267,13.428495903,14.934192855,15.550239234,13.261727313,11.604133282,12.968863547,10.58562404,11.33013469,12.460696402,12.517547964,10.996563574,10.6365834,11.744236625,11.508110478,11.604133282,12.633461904,11.837687098,14.914156888,13.275882147,12.751520824,2.4319323288,4.2976094547,3.8060026098,1.7536168347,0,0.3354016435,-1.252063058,-3.584022198,-0.815185746,-0.233972859,0,0,0,0,0,0,0,0,0,0,-16.91779011,-22.66988987,-10.11309265,-11.28890837,-7.072995524,-16.43468053,-18.66712196,-7.746112492,-2.445557238,-5.61534862,-16.91779011,-22.66988987,-10.11309265,-11.28890837,-7.072995524,-16.43468053,-18.66712196,-7.746112492,-2.445557238,-5.61534862 +050,3,5,13,275,Georgia,Thomas County,44720,44719,44744,44591,44535,44783,44784,44819,44967,44623,44336,44427,44372,25,-153,-56,248,1,35,148,-344,-287,91,-55,159,554,592,597,611,569,550,577,515,509,521,145,500,495,496,484,487,509,535,521,558,577,14,54,97,101,127,82,41,42,-6,-49,-56,4,8,14,24,40,31,29,12,6,8,6,13,-215,-164,125,-158,-73,82,-398,-288,133,-7,17,-207,-150,149,-118,-42,111,-386,-282,141,-1,-6,0,-3,-2,-8,-5,-4,0,1,-1,2,848,849,860,840,791,685,711,716,640,645,655,651,12.40275368,13.284563427,13.367966143,13.643417777,12.700467618,12.251353218,12.880901886,11.578367563,11.468742607,11.734366378,11.193821011,11.107869757,11.106383932,10.807551889,10.870171758,11.338070523,11.943297243,11.713261165,12.572806237,12.995641843,1.2089326692,2.1766936696,2.2615822119,2.8358658881,1.8302958606,0.9132826944,0.9376046434,-0.134893603,-1.10406363,-1.261275465,0.1791011362,0.3141619729,0.5374056741,0.8931861065,0.691941118,0.6459804424,0.267887041,0.1348936027,0.1802552865,0.1351366569,-4.813343035,-3.680183112,2.798987886,-3.528085121,-1.62940973,1.8265653888,-8.884920192,-6.474892928,2.9967441389,-0.157659433,-4.634241898,-3.366021139,3.3363935601,-2.634899014,-0.937468612,2.4725458312,-8.617033151,-6.339999326,3.1769994254,-0.022522776 +050,3,5,13,277,Georgia,Tift County,40118,40132,40250,41160,40947,40180,40456,40538,40562,40455,40562,40653,40719,118,910,-213,-767,276,82,24,-107,107,91,66,128,559,565,567,570,604,570,548,551,544,537,57,389,378,376,406,407,411,421,471,445,466,71,170,187,191,164,197,159,127,80,99,71,-3,-4,2,3,1,11,27,16,11,-3,5,48,737,-410,-996,110,-124,-159,-250,18,-6,-12,45,733,-408,-993,111,-113,-132,-234,29,-9,-7,2,7,8,35,1,-2,-3,0,-2,1,2,1568,1530,1521,1481,1414,1612,1524,1517,1537,1554,1587,1588,13.732956639,13.762529382,13.978083745,14.137606032,14.914685038,14.056720099,13.528024982,13.602083513,13.396540048,13.198643268,9.5565655325,9.2074975337,9.2694170868,10.069943946,10.05012717,10.135635018,10.392880507,11.627189355,10.958566767,11.453571253,4.1763911067,4.5550318487,4.7086666584,4.0676620864,4.8645578685,3.9210850801,3.1351444759,1.974894158,2.4379732808,1.7450720149,-0.098268026,0.0487169182,0.0739581151,0.0248028176,0.2716250586,0.6658446363,0.3949788316,0.2715479467,-0.073877978,0.1228923954,18.105883798,-9.986968224,-24.5540942,2.728309936,-3.061955207,-3.92108508,-6.171544244,0.4443511856,-0.147755956,-0.294941749,18.007615772,-9.938251306,-24.48013608,2.7531127536,-2.790330148,-3.255240444,-5.776565412,0.7158991323,-0.221633935,-0.172049354 +050,3,5,13,279,Georgia,Toombs County,27223,27174,27248,27198,27170,27184,27131,27151,27141,26868,26910,26844,26973,74,-50,-28,14,-53,20,-10,-273,42,-66,129,94,410,409,393,395,417,408,333,387,361,364,40,276,325,291,312,327,302,342,308,313,350,54,134,84,102,83,90,106,-9,79,48,14,5,-9,-7,2,-8,-4,-1,-4,-1,-16,-9,18,-177,-108,-87,-124,-62,-114,-259,-35,-97,124,23,-186,-115,-85,-132,-66,-115,-263,-36,-113,115,-3,2,3,-3,-4,-4,-1,-1,-1,-1,0,387,387,389,390,399,395,389,391,407,331,390,390,15.060794181,15.045615068,14.460757258,14.54478505,15.36420913,15.02983865,12.33127812,14.39250251,13.431558582,13.52732408,10.138485839,11.955562095,10.707583619,11.488539078,12.048192771,11.125027628,12.664555907,11.454498122,11.645644975,13.007042384,4.9223083422,3.0900529723,3.7531736395,3.0562459726,3.316016359,3.9048110219,-0.333277787,2.9380043884,1.7859136064,0.5202816954,-0.330602799,-0.257504414,0.07359164,-0.294577925,-0.147378505,-0.03683784,-0.148123461,-0.037189929,-0.595304535,-0.334466804,-6.501855049,-3.97292525,-3.20123634,-4.565957839,-2.284366825,-4.199513741,-9.590994094,-1.301647514,-3.609033746,4.6082093019,-6.832457848,-4.230429665,-3.1276447,-4.860535764,-2.43174533,-4.23635158,-9.739117554,-1.338837443,-4.204338282,4.2737424977 +050,3,5,13,281,Georgia,Towns County,10471,10474,10531,10577,10560,10784,11081,11208,11416,11557,11844,12009,12247,57,46,-17,224,297,127,208,141,287,165,238,20,76,75,83,84,77,90,105,86,94,100,25,171,163,160,161,153,174,213,193,170,193,-5,-95,-88,-77,-77,-76,-84,-108,-107,-76,-93,0,-1,3,2,2,6,12,8,7,7,6,58,141,65,293,358,195,279,240,385,237,325,58,140,68,295,360,201,291,248,392,244,331,4,1,3,6,14,2,1,1,2,-3,0,698,719,748,809,885,1037,1094,1092,1093,1190,1167,1167,7.201061209,7.0965605337,7.7773613193,7.6835124628,6.9092377406,7.9561527581,9.1411657163,7.350113243,7.8816081835,8.2453825858,16.20238772,15.42319156,14.992503748,14.72673222,13.728745121,15.381895332,18.543507596,16.49502158,14.253972247,15.913588391,-9.001326511,-8.326631026,-7.215142429,-7.043219758,-6.81950738,-7.425742574,-9.40234188,-9.144908337,-6.372364063,-7.668205805,-0.094750805,0.2838624213,0.1874062969,0.1829407729,0.5383821616,1.0608203678,0.6964697689,0.5982650314,0.586928269,0.4947229551,13.359863559,6.1503524625,27.455022489,32.746398354,17.497420252,24.66407355,20.894093066,32.904576727,19.87171425,26.797493404,13.265112753,6.4342148839,27.642428786,32.929339126,18.035802414,25.724893918,21.590562835,33.502841759,20.458642519,27.292216359 +050,3,5,13,283,Georgia,Treutlen County,6885,6883,6892,6823,6787,6686,6813,6807,6720,6751,6780,6860,6822,9,-69,-36,-101,127,-6,-87,31,29,80,-38,23,70,78,72,79,83,77,78,71,73,69,5,90,56,80,63,72,65,87,92,53,82,18,-20,22,-8,16,11,12,-9,-21,20,-13,0,0,3,5,7,9,15,6,4,3,0,-8,-49,-61,-99,103,-26,-115,35,46,58,-25,-8,-49,-58,-94,110,-17,-100,41,50,61,-25,-1,0,0,1,1,0,1,-1,0,-1,0,452,459,479,465,365,420,421,362,424,476,495,494,10.207801677,11.462160176,10.688042752,11.704570709,12.187958884,11.384638131,11.580432039,10.49442022,10.703812317,10.086244701,13.124316442,8.2292432035,11.875603058,9.3340247426,10.572687225,9.610408812,12.916635736,13.598403666,7.7712609971,11.986551674,-2.916514765,3.2329169728,-1.187560306,2.3705459664,1.6152716593,1.7742293191,-1.336203697,-3.103983445,2.9325513196,-1.900306973,0,0.4408523145,0.7422251911,1.0371138603,1.3215859031,2.2177866489,0.8908024646,0.591234942,0.4398826979,0,-7.145461174,-8.963997061,-14.69605878,15.260389658,-3.817914831,-17.00303098,5.1963477099,6.7992018328,8.504398827,-3.654436486,-7.145461174,-8.523144747,-13.95383359,16.297503519,-2.496328928,-14.78524433,6.0871501744,7.3904367748,8.9442815249,-3.654436486 +050,3,5,13,285,Georgia,Troup County,67044,67042,67060,67651,68324,68859,69341,69666,69990,70123,70091,70059,70214,18,591,673,535,482,325,324,133,-32,-32,155,185,942,893,867,895,995,901,859,892,939,910,203,629,617,683,639,687,726,677,737,737,810,-18,313,276,184,256,308,175,182,155,202,100,10,21,40,84,85,125,166,120,101,104,85,33,258,366,266,152,-100,-13,-167,-285,-341,-33,43,279,406,350,237,25,153,-47,-184,-237,52,-7,-1,-9,1,-11,-8,-4,-2,-3,3,3,2073,2058,2035,2080,2230,2282,2307,2326,2306,2522,2163,2162,13.985494874,13.13476742,12.640050152,12.952243126,14.315825822,12.903133414,12.261531764,12.723408504,13.399928648,12.974699336,9.338509847,9.0751976466,9.9575020228,9.2474674385,9.8843943111,10.396975425,9.6636286426,10.512502318,10.51730289,11.5489082,4.6469850272,4.0595697739,2.6825481291,3.7047756874,4.4314315106,2.5061579882,2.5979031211,2.2109061863,2.8826257581,1.4257911359,0.3117785482,0.5883434455,1.2246415372,1.2301013025,1.7984705806,2.3772698631,1.7129031567,1.4406549988,1.4841241527,1.2119224655,3.830422163,5.3833425262,3.8780315345,2.1997105644,-1.438776464,-0.186171736,-2.383790226,-4.065214601,-4.86621477,-0.470511075,4.1422007112,5.9716859717,5.1026730717,3.4298118669,0.3596941161,2.1910981268,-0.67088707,-2.624559602,-3.382090617,0.7414113906 +050,3,5,13,287,Georgia,Turner County,8930,8931,8909,8941,8446,8208,8069,7988,7970,7902,7917,7929,7882,-22,32,-495,-238,-139,-81,-18,-68,15,12,-47,27,121,102,113,121,102,135,88,125,108,124,42,118,86,91,118,143,111,121,105,133,127,-15,3,16,22,3,-41,24,-33,20,-25,-3,0,0,-5,-4,-4,0,1,0,0,0,-1,-12,30,-530,-269,-139,-37,-44,-34,-4,37,-44,-12,30,-535,-273,-143,-37,-43,-34,-4,37,-45,5,-1,24,13,1,-3,1,-1,-1,0,1,371,381,412,383,369,382,392,384,375,386,393,393,13.557422969,11.732903894,13.570313438,14.867604595,12.704739366,16.91941346,11.088709677,15.803780264,13.631200303,15.685282398,13.221288515,9.892448381,10.928305512,14.4989863,17.811546366,13.911517734,15.246975806,13.275175422,16.786570743,16.064765037,0.3361344538,1.8404555127,2.642007926,0.3686182958,-5.106807,3.0078957263,-4.158266129,2.5286048423,-3.15537044,-0.379482639,0,-0.575142348,-0.480365077,-0.491491061,0,0.1253289886,0,0,0,-0.126494213,3.3613445378,-60.96508886,-32.30455146,-17.07931437,-4.608581927,-5.514475498,-4.284274194,-0.505720968,4.6699482519,-5.565745367,3.3613445378,-61.54023121,-32.78491654,-17.57080543,-4.608581927,-5.38914651,-4.284274194,-0.505720968,4.6699482519,-5.69223958 +050,3,5,13,289,Georgia,Twiggs County,9023,9035,8983,8836,8560,8522,8399,8353,8263,8268,8179,8164,8103,-52,-147,-276,-38,-123,-46,-90,5,-89,-15,-61,14,105,107,94,87,85,98,90,79,73,69,17,117,82,119,118,102,129,87,127,108,148,-3,-12,25,-25,-31,-17,-31,3,-48,-35,-79,0,5,2,1,12,17,30,20,14,16,13,-53,-140,-312,-14,-105,-45,-88,-18,-54,5,5,-53,-135,-310,-13,-93,-28,-58,2,-40,21,18,4,0,9,0,1,-1,-1,0,-1,-1,0,89,89,89,89,89,89,89,89,89,89,106,106,11.78517313,12.301678547,11.005737033,10.283080196,10.148042025,11.795859413,10.888633476,9.6066151882,8.9334883436,8.4834327165,13.132050059,9.4274545873,13.932794755,13.947166243,12.17765043,15.527202696,10.525679027,15.443545935,13.216667686,18.196348435,-1.346876929,2.8742239595,-2.927057722,-3.664086047,-2.029608405,-3.731343284,0.3629544492,-5.836930747,-4.283179343,-9.712915719,0.5611987205,0.2299379168,0.1170823089,1.4183558891,2.029608405,3.6109773712,2.4196963281,1.7024381346,1.9580248424,1.5983279031,-15.71356417,-35.87031501,-1.639152324,-12.41061403,-5.372492837,-10.59220029,-2.177726695,-6.566547091,0.6118827633,0.6147415012,-15.15236545,-35.6403771,-1.522070015,-10.99225814,-3.342884432,-6.981222918,0.2419696328,-4.864108956,2.5699076057,2.2130694043 +050,3,5,13,291,Georgia,Union County,21356,21370,21384,21265,21342,21440,21782,22029,22664,23406,23961,24606,25358,14,-119,77,98,342,247,635,742,555,645,752,40,164,167,140,155,181,171,170,161,178,169,48,301,282,308,314,308,301,322,339,321,316,-8,-137,-115,-168,-159,-127,-130,-152,-178,-143,-147,2,4,4,6,9,-5,-1,0,-2,0,-1,22,17,188,256,483,375,764,890,732,791,905,24,21,192,262,492,370,763,890,730,791,904,-2,-3,0,4,9,4,2,4,3,-3,-5,379,356,315,298,293,290,249,251,303,305,296,296,7.690684424,7.8390874739,6.5448085643,7.1722733793,8.262765059,7.6522050433,7.3800738007,6.7979817172,7.3300800955,6.7648707069,14.115219583,13.237261483,14.398578842,14.529637685,14.060395791,13.469670866,13.978728023,14.313762746,13.218852307,12.649107357,-6.424535159,-5.398174009,-7.853770277,-7.357364305,-5.797630732,-5.817465822,-6.598654222,-7.515781029,-5.888772212,-5.88423665,0.1875776689,0.1877625742,0.2804917956,0.4164545833,-0.228253178,-0.044749737,0,-0.084446978,0,-0.040028821,0.7972050927,8.8248409886,11.967649946,22.349729305,17.118988382,34.188799141,38.636856957,30.907593894,32.573558177,36.22608278,0.9847827616,9.0126035628,12.248141742,22.766183888,16.890735203,34.144049404,38.636856957,30.823146917,32.573558177,36.186053959 +050,3,5,13,293,Georgia,Upson County,27153,27147,27052,26919,26561,26425,26166,26237,26243,26223,26249,26402,26527,-95,-133,-358,-136,-259,71,6,-20,26,153,125,82,341,306,333,309,362,309,346,302,309,298,119,350,314,372,359,365,349,375,387,437,425,-37,-9,-8,-39,-50,-3,-40,-29,-85,-128,-127,3,0,-4,-4,-1,2,3,7,7,7,4,-63,-122,-356,-90,-208,74,44,3,107,275,249,-60,-122,-360,-94,-209,76,47,10,114,282,253,2,-2,10,-3,0,-2,-1,-1,-3,-1,-1,474,471,458,404,411,402,407,369,371,376,414,414,12.636415853,11.443530292,12.569357944,11.751060067,13.816002901,11.775914634,13.189494149,11.510901052,11.7376688,11.260367662,12.969928295,11.742707554,14.04144491,13.652526098,13.930500162,13.300304878,14.294971982,14.750724196,16.599874646,16.059249183,-0.333512442,-0.299177263,-1.472086966,-1.90146603,-0.114497262,-1.524390244,-1.105477833,-3.239823144,-4.862205846,-4.798881521,0,-0.149588631,-0.150983279,-0.038029321,0.0763315077,0.1143292683,0.266839477,0.2668089648,0.2659018822,0.1511458747,-4.520946434,-13.31338818,-3.397123769,-7.910098686,2.8242657863,1.6768292683,0.1143597759,4.0783656045,10.446145372,9.4088306977,-4.520946434,-13.46297681,-3.548107047,-7.948128007,2.900597294,1.7911585366,0.3811992528,4.3451745693,10.712047255,9.5599765724 +050,3,5,13,295,Georgia,Walker County,68756,68739,68876,68825,68487,68643,68714,68604,68509,69087,69507,69769,70116,137,-51,-338,156,71,-110,-95,578,420,262,347,180,722,737,728,734,778,728,740,765,733,731,124,619,692,757,718,776,828,876,791,854,887,56,103,45,-29,16,2,-100,-136,-26,-121,-156,5,-5,-6,-11,9,33,67,36,26,30,24,76,-147,-377,204,65,-136,-60,680,424,352,478,81,-152,-383,193,74,-103,7,716,450,382,502,0,-2,0,-8,-19,-9,-2,-2,-4,1,1,1323,1399,1485,1284,1297,1364,1497,1262,1268,1319,1356,1353,10.486488842,10.734677231,10.617662072,10.687478614,11.331362239,10.618978507,10.756126632,11.039438937,10.525862317,10.451442256,8.9904938962,10.079235609,11.040618391,10.454509053,11.302232774,12.077629401,12.732928283,11.414635554,12.263419397,12.681845802,1.4959949456,0.655441622,-0.422956319,0.2329695611,0.0291294659,-1.458650894,-1.976801651,-0.375196617,-1.737557081,-2.230403546,-0.072621114,-0.087392216,-0.160431707,0.1310453781,0.4806361875,0.9772960988,0.5232710253,0.3751966175,0.4307992763,0.343139007,-2.135060748,-5.491144255,2.9752789324,0.9464388419,-1.980803682,-0.875190536,9.8840082561,6.1185909924,5.0547115081,6.8341852236,-2.207681861,-5.578536472,2.8148472253,1.07748422,-1.500167494,0.1021055626,10.407279281,6.4937876099,5.4855107843,7.1773242306 +050,3,5,13,297,Georgia,Walton County,83768,83808,83997,84647,84998,86068,87557,88373,89886,91389,93450,94818,96875,189,650,351,1070,1489,816,1513,1503,2061,1368,2057,261,1085,1088,1045,1057,1038,1063,1023,1086,1052,1157,143,766,689,736,722,833,813,802,900,934,985,118,319,399,309,335,205,250,221,186,118,172,5,-6,34,56,49,37,62,18,8,7,14,73,340,-77,705,1098,579,1200,1263,1865,1246,1878,78,334,-43,761,1147,616,1262,1281,1873,1253,1892,-7,-3,-5,0,7,-5,1,1,2,-3,-7,682,708,708,686,675,675,639,629,668,720,792,792,12.867341856,12.826785346,12.217506693,12.175665947,11.800147786,11.926466546,11.286719073,11.750766884,11.175558247,12.071384975,9.0842247575,8.1228447641,8.6048659582,8.316774658,9.4696754391,9.1215590798,8.8484346987,9.7382045997,9.922026048,10.27684892,3.7831170987,4.7039405818,3.6126407352,3.8588912887,2.330472347,2.8049074661,2.4382843746,2.0125622839,1.2535321988,1.794536055,-0.071155807,0.4008370421,0.654718062,0.5644348452,0.4206218382,0.6956170516,0.1985932975,0.0865618187,0.0743620796,0.1460668882,4.032162425,-0.907778007,8.2424327453,12.647948164,6.5821633604,13.463555837,13.934629706,20.179723976,13.236450167,19.593829717,3.9610066175,-0.506940965,8.8971508073,13.212383009,7.0027851987,14.159172889,14.133223004,20.266285795,13.310812246,19.739896606 +050,3,5,13,299,Georgia,Ware County,36312,36298,36308,36279,35896,35745,35520,35337,35675,35705,35703,35816,35826,10,-29,-383,-151,-225,-183,338,30,-2,113,10,127,513,502,479,460,475,506,475,509,480,503,134,433,435,440,440,439,456,455,477,520,488,-7,80,67,39,20,36,50,20,32,-40,15,2,4,15,25,5,-1,18,10,7,8,4,18,-110,-478,-212,-256,-218,271,2,-41,145,-11,20,-106,-463,-187,-251,-219,289,12,-34,153,-7,-3,-3,13,-3,6,0,-1,-2,0,0,2,2409,2439,2500,2386,2392,2174,2141,2347,2404,2375,2468,2471,14.134762423,13.910633876,13.372230985,12.909562899,13.407285095,14.251112488,13.309050154,14.256105758,13.423006474,14.042042377,11.930510973,12.054035331,12.283468963,12.348277556,12.391154014,12.842899792,12.748669095,13.359847636,14.541590347,13.623293599,2.20425145,1.8565985452,1.0887620217,0.5612853434,1.0161310809,1.4082126964,0.5603810591,0.8962581223,-1.118583873,0.4187487786,0.1102125725,0.4156563907,0.6979243729,0.1403213359,-0.028225863,0.5069565707,0.2801905296,0.1960564643,0.2237167746,0.111666341,-3.030845744,-13.24558365,-5.918398682,-7.184452396,-6.153238212,7.6325128147,0.0560381059,-1.148330719,4.054866539,-0.307082438,-2.920633171,-12.82992726,-5.220474309,-7.04413106,-6.181464076,8.1394693855,0.3362286355,-0.952274255,4.2785833135,-0.195416097 +050,3,5,13,301,Georgia,Warren County,5834,5834,5782,5679,5546,5520,5459,5375,5355,5263,5227,5220,5232,-52,-103,-133,-26,-61,-84,-20,-92,-36,-7,12,13,69,75,57,41,55,62,56,66,58,59,34,79,68,81,68,90,93,80,68,61,72,-21,-10,7,-24,-27,-35,-31,-24,-2,-3,-13,0,0,1,1,1,2,0,0,0,0,0,-33,-94,-143,-4,-34,-50,11,-68,-34,-3,24,-33,-94,-142,-3,-33,-48,11,-68,-34,-3,24,2,1,2,1,-1,-1,0,0,0,-1,1,89,90,91,89,89,89,89,89,85,85,89,89,12.040834133,13.363028953,10.301825411,7.4688040805,10.15322134,11.55638397,10.548125824,12.583412774,11.103666124,11.28970532,13.785882558,12.115812918,14.639436111,12.387284816,16.614362193,17.334575955,15.068751177,12.964728313,11.677993682,13.777267509,-1.745048425,1.2472160356,-4.337610699,-4.918480736,-6.461140853,-5.778191985,-4.520625353,-0.381315539,-0.574327558,-2.487562189,0,0.1781737194,0.1807337791,0.1821659532,0.3692080487,0,0,0,0,0,-16.4034552,-25.47884187,-0.722935117,-6.193642408,-9.230201218,2.0503261883,-12.8084385,-6.482364156,-0.574327558,4.5924225029,-16.4034552,-25.30066815,-0.542201337,-6.011476455,-8.86099317,2.0503261883,-12.8084385,-6.482364156,-0.574327558,4.5924225029 +050,3,5,13,303,Georgia,Washington County,21187,21181,21096,20971,20791,20575,20549,20734,20349,20313,20418,20352,20150,-85,-125,-180,-216,-26,185,-385,-36,105,-66,-202,53,235,265,221,258,231,228,210,225,228,222,87,208,202,180,212,228,245,237,223,253,257,-34,27,63,41,46,3,-17,-27,2,-25,-35,0,0,-1,0,0,2,7,3,1,1,1,-55,-152,-249,-266,-72,178,-378,-12,102,-42,-168,-55,-152,-250,-266,-72,180,-371,-9,103,-41,-167,4,0,7,9,0,2,3,0,0,0,0,1896,1887,1867,1896,1684,1633,1882,1604,1677,1865,1879,1879,11.172653149,12.690963076,10.685103708,12.547417566,11.191047162,11.099481537,10.329054154,11.048096045,11.184694628,10.962421609,9.8889866166,9.6738661941,8.7027994005,10.310281101,11.045708887,11.927074459,11.657075402,10.949890747,12.411086583,12.690731322,1.283666532,3.0170968823,1.9823043079,2.2371364653,0.1453382748,-0.827592922,-1.328021248,0.0982052982,-1.226391955,-1.728309713,0,-0.047890427,0,0,0.0968921832,0.340773556,0.1475579165,0.0491026491,0.0490556782,0.0493802775,-7.226567143,-11.92471625,-12.86080356,-3.501604902,8.6234043069,-18.40177202,-0.590231666,5.008470207,-2.060338484,-8.295886623,-7.226567143,-11.97260668,-12.86080356,-3.501604902,8.7202964901,-18.06099847,-0.442673749,5.0575728561,-2.011282806,-8.246506345 +050,3,5,13,305,Georgia,Wayne County,30099,30102,30080,30301,30331,30009,29916,29460,30038,29843,29874,30017,30023,-22,221,30,-322,-93,-456,578,-195,31,143,6,104,442,394,395,381,402,428,354,370,361,348,115,293,288,305,327,330,347,340,398,358,362,-11,149,106,90,54,72,81,14,-28,3,-14,-2,-4,2,20,20,37,33,21,18,6,7,-8,79,-72,-445,-167,-579,460,-231,41,135,11,-10,75,-70,-425,-147,-542,493,-210,59,141,18,-1,-3,-6,13,0,14,4,1,0,-1,2,2316,2314,2317,2303,2238,2311,1494,2058,1858,1997,2064,2062,14.640367003,12.996437525,13.09247597,12.715894869,13.540824576,14.38703822,11.823449842,12.391781235,12.055233675,11.592271819,9.7050396648,9.4999340282,10.109380179,10.913642053,11.115602264,11.664257622,11.355855781,13.329537653,11.955051677,12.058627582,4.9353273381,3.4965034965,2.9830957905,1.802252816,2.425222312,2.7227805977,0.4675940616,-0.937756418,0.1001819973,-0.466355763,-0.132492009,0.0659717641,0.6629101757,0.667501043,1.2462947992,1.1092809842,0.7013910923,0.6028434114,0.2003639946,0.2331778814,2.6167171792,-2.374983507,-14.74975141,-5.573633709,-19.50282943,15.462704629,-7.715302016,1.373143326,4.5081898783,0.3664223851,2.4842251702,-2.309011743,-14.08684123,-4.906132666,-18.25653463,16.571985613,-7.013910923,1.9759867374,4.7085538729,0.5996002665 +050,3,5,13,307,Georgia,Webster County,2799,2799,2781,2764,2766,2670,2612,2632,2607,2586,2575,2573,2595,-18,-17,2,-96,-58,20,-25,-21,-11,-2,22,4,14,25,18,16,35,18,27,20,30,20,9,18,16,15,22,20,19,32,26,25,24,-5,-4,9,3,-6,15,-1,-5,-6,5,-4,0,1,-2,0,0,1,1,-2,-2,-2,-2,-14,-14,-4,-102,-53,3,-24,-13,-3,-6,28,-14,-13,-6,-102,-53,4,-23,-15,-5,-8,26,1,0,-1,3,1,1,-1,-1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,5.049594229,9.0415913201,6.6225165563,6.0583112457,13.348588863,6.8715403703,10.398613518,7.750435962,11.655011655,7.7399380805,6.4923354373,5.7866184448,5.5187637969,8.3301779629,7.6277650648,7.2532926131,12.324282688,10.075566751,9.7125097125,9.2879256966,-1.442741208,3.2549728752,1.1037527594,-2.271866717,5.7208237986,-0.381752243,-1.92566917,-2.325130789,1.9425019425,-1.547987616,0.3606853021,-0.723327306,0,0,0.3813882532,0.3817522428,-0.770267668,-0.775043596,-0.777000777,-0.773993808,-5.049594229,-1.446654611,-37.52759382,-20.068156,1.1441647597,-9.162053827,-5.006739842,-1.162565394,-2.331002331,10.835913313,-4.688908927,-2.169981917,-37.52759382,-20.068156,1.525553013,-8.780301584,-5.77700751,-1.937608991,-3.108003108,10.061919505 +050,3,5,13,309,Georgia,Wheeler County,7421,7431,7770,8078,7932,7934,7984,7909,8012,7958,7891,7870,7751,339,308,-146,2,50,-75,103,-54,-67,-21,-119,15,65,53,62,61,66,62,66,70,64,63,4,53,69,54,66,72,61,49,81,46,67,11,12,-16,8,-5,-6,1,17,-11,18,-4,0,0,0,-1,0,0,0,0,0,0,0,285,292,-135,-3,54,-70,102,-73,-57,-39,-114,285,292,-135,-4,54,-70,102,-73,-57,-39,-114,43,4,5,-2,1,1,0,2,1,0,-1,1959,2296,2644,2558,2564,2575,2510,2572,2551,2514,2513,2510,8.2029278142,6.6208619613,7.8154544309,7.6642794321,8.305543321,7.788455499,8.2654978084,8.8333648811,8.1213120995,8.0660649126,6.6885411408,8.619612742,6.8070086978,8.2924990577,9.0605927138,7.662835249,6.1365059487,10.221465077,5.8371930715,8.5781960182,1.5143866734,-1.998750781,1.008445733,-0.628219626,-0.755049393,0.12562025,2.1289918597,-1.388100196,2.284119028,-0.512131106,0,0,-0.126055717,0,0,0,0,0,0,0,36.850075719,-16.86445971,-0.37816715,6.7847719563,-8.808909583,12.813265498,-9.142141515,-7.192882832,-4.948924561,-14.59573651,36.850075719,-16.86445971,-0.504222867,6.7847719563,-8.808909583,12.813265498,-9.142141515,-7.192882832,-4.948924561,-14.59573651 +050,3,5,13,311,Georgia,White County,27144,27139,27201,27401,27626,27831,28025,28389,28793,29429,29893,30601,31094,62,200,225,205,194,364,404,636,464,708,493,52,259,238,276,278,266,235,305,285,276,280,57,239,263,251,258,290,278,282,290,319,375,-5,20,-25,25,20,-24,-43,23,-5,-43,-95,1,3,23,24,18,19,10,5,4,3,5,62,178,226,156,159,368,435,605,465,749,588,63,181,249,180,177,387,445,610,469,752,593,4,-1,1,0,-3,1,2,3,0,-1,-5,365,411,459,568,547,624,603,641,651,689,823,823,9.4868319842,8.6502989442,9.9536577889,9.9541678602,9.430283263,8.2193697317,10.477139226,9.6085769192,9.1248718881,9.0769106086,8.7542580858,9.5589437912,9.0520583515,9.238040676,10.281135888,9.7233395124,9.6870598743,9.7771484441,10.546500479,12.156576708,0.7325738984,-0.908644847,0.9015994374,0.7161271842,-0.850852625,-1.503969781,0.7900793514,-0.168571525,-1.421628591,-3.079666099,0.1098860848,0.8359532593,0.8655354599,0.6445144658,0.6735916616,0.3497604141,0.1717563807,0.1348572199,0.0991833901,0.1620876894,6.5199076957,8.2141494176,5.6259804894,5.6932111143,13.04640692,15.214578014,20.782522071,15.677151816,24.762786392,19.061512278,6.6297937804,9.0501026769,6.4915159493,6.3377255801,13.719998582,15.564338428,20.954278451,15.812009035,24.861969782,19.223599968 +050,3,5,13,313,Georgia,Whitfield County,102599,102602,102740,102909,102926,102691,103039,103621,104314,104086,104109,104265,103837,138,169,17,-235,348,582,693,-228,23,156,-428,380,1471,1413,1357,1385,1385,1443,1364,1340,1237,1250,146,730,784,800,817,771,864,856,811,935,941,234,741,629,557,568,614,579,508,529,302,309,-48,-87,-3,-14,-35,141,178,48,7,2,-4,-41,-482,-611,-779,-167,-161,-60,-785,-512,-152,-736,-89,-569,-614,-793,-202,-20,118,-737,-505,-150,-740,-7,-3,2,1,-18,-12,-4,1,-1,4,3,1002,1025,1065,1007,988,1001,1023,1088,1086,1060,1124,1126,14.305929034,13.729443486,13.199297723,13.464249259,13.403658183,13.879337293,13.090211132,12.872547371,11.872882413,12.013339612,7.0994753196,7.617752083,7.7814577588,7.9424488407,7.4615310171,8.3102892731,8.2149712092,7.7907730733,8.9742482267,9.0436420601,7.2064537148,6.1116914033,5.4178399646,5.521800418,5.9421271654,5.5690480198,4.8752399232,5.0817742981,2.8986341866,2.9696975522,-0.846101853,-0.029149562,-0.136175511,-0.340251786,1.3645601471,1.7120734845,0.4606525912,0.0672446504,0.0191962529,-0.038442687,-4.687598773,-5.936794034,-7.577194493,-1.623487095,-1.558114778,-0.577103422,-7.533589251,-4.918465861,-1.45891522,-7.073454364,-5.533700626,-5.965943596,-7.713370003,-1.963738881,-0.193554631,1.1349700628,-7.07293666,-4.851221211,-1.439718967,-7.11189705 +050,3,5,13,315,Georgia,Wilcox County,9255,9251,9313,9248,9069,9054,8929,9015,8834,8780,8784,8607,8502,62,-65,-179,-15,-125,86,-181,-54,4,-177,-105,21,110,80,83,114,76,94,95,71,78,76,55,114,94,109,112,102,119,85,102,70,110,-34,-4,-14,-26,2,-26,-25,10,-31,8,-34,0,1,2,1,-1,1,2,1,1,1,1,91,-62,-175,11,-130,110,-160,-66,36,-187,-72,91,-61,-173,12,-131,111,-158,-65,37,-186,-71,5,0,8,-1,4,1,2,1,-2,1,0,2019,2096,2060,2059,2058,1997,2097,1929,1959,1973,1853,1849,11.852809655,8.7350548671,9.1596314076,12.678640939,8.4707980383,10.532802958,10.786874077,8.0847187429,8.9701569777,8.8842129873,12.283820915,10.263689469,12.028913535,12.456208641,11.36870263,13.334080341,9.6514136482,11.614666363,8.0501408775,12.858729324,-0.43101126,-1.528634602,-2.869282128,0.2224322972,-2.897904592,-2.801277382,1.1354604292,-3.52994762,0.9200161003,-3.974516336,0.107752815,0.2183763717,0.1103570049,-0.111216149,0.1114578689,0.2241021906,0.1135460429,0.1138692781,0.1150020125,0.1168975393,-6.680674533,-19.10793252,1.213927054,-14.45809932,12.260365582,-17.92817525,-7.494038833,4.0992940105,-21.50537634,-8.41662283,-6.572921718,-18.88955615,1.3242840589,-14.56931546,12.371823451,-17.70407306,-7.38049279,4.2131632885,-21.39037433,-8.299725291 +050,3,5,13,317,Georgia,Wilkes County,10593,10593,10389,10230,10093,9931,9960,9927,9808,9868,9845,9769,9694,-204,-159,-137,-162,29,-33,-119,60,-23,-76,-75,28,110,135,106,100,115,93,101,97,102,95,19,128,152,167,114,153,134,137,155,132,163,9,-18,-17,-61,-14,-38,-41,-36,-58,-30,-68,0,2,4,12,13,35,24,9,6,4,3,-240,-143,-128,-114,31,-32,-99,88,28,-49,-11,-240,-141,-124,-102,44,3,-75,97,34,-45,-8,27,0,4,1,-1,2,-3,-1,1,-1,1,344,131,131,135,106,132,116,133,142,185,183,182,10.6697706,13.285440142,10.587295246,10.054798653,11.565344195,9.4248796554,10.266314292,9.8412215289,10.400734169,9.7621127267,12.415733062,14.958421493,16.679984019,11.462470464,15.386936189,13.579934127,13.925594633,15.725663268,13.459773631,16.749730257,-1.745962462,-1.672981351,-6.092688773,-1.407671811,-3.821591995,-4.155054472,-3.659280342,-5.884441739,-3.059039462,-6.987617531,0.1939958291,0.3936426709,1.1985617259,1.3071238248,3.5198873636,2.4322270079,0.9148200854,0.6087353523,0.4078719282,0.308277244,-13.87070178,-12.59656547,-11.3863364,3.1169875823,-3.218182732,-10.03293641,8.9449075015,2.8407649774,-4.996431121,-1.130349895,-13.67670595,-12.2029228,-10.18777467,4.4241114072,0.3017046312,-7.6007094,9.8597275869,3.4495003297,-4.588559192,-0.822072651 +050,3,5,13,319,Georgia,Wilkinson County,9563,9569,9528,9413,9481,9361,9283,9080,9021,8953,9005,8936,8812,-41,-115,68,-120,-78,-203,-59,-68,52,-69,-124,33,133,106,101,122,97,98,110,88,94,96,42,112,109,111,119,124,124,127,128,91,138,-9,21,-3,-10,3,-27,-26,-17,-40,3,-42,0,-2,0,-2,0,0,1,0,0,0,0,-33,-134,69,-107,-80,-179,-32,-51,92,-71,-82,-33,-136,69,-109,-80,-179,-31,-51,92,-71,-82,1,0,2,-1,-1,3,-2,0,0,-1,0,110,110,109,117,115,114,108,119,114,175,179,179,14.043609102,11.220493278,10.720730283,13.087320318,10.56472254,10.828131042,12.239902081,9.8006459517,10.478791595,10.818120352,11.826197138,11.538054409,11.782188727,12.765500965,13.505418505,13.700900503,14.131523311,14.255485021,10.144362076,15.551048005,2.2174119635,-0.317561131,-1.061458444,0.3218193521,-2.940695965,-2.87276946,-1.891621231,-4.454839069,0.334429519,-4.732927654,-0.211182092,0,-0.212291689,0,0,0.1104911331,0,0,0,0,-14.14920015,7.3039060019,-11.35760535,-8.581849389,-19.4957251,-3.535716259,-5.674863692,10.246129859,-7.914831949,-9.2404778,-14.36038224,7.3039060019,-11.56989704,-8.581849389,-19.4957251,-3.425225126,-5.674863692,10.246129859,-7.914831949,-9.2404778 +050,3,5,13,321,Georgia,Worth County,21679,21667,21692,21516,21356,21058,21010,20692,20732,20532,20307,20185,19972,25,-176,-160,-298,-48,-318,40,-200,-225,-122,-213,57,237,244,271,274,244,266,205,246,210,196,65,205,218,208,233,222,207,230,249,281,275,-8,32,26,63,41,22,59,-25,-3,-71,-79,1,-5,-1,1,-1,2,7,4,3,2,4,31,-204,-190,-371,-86,-345,-25,-178,-226,-53,-138,32,-209,-191,-370,-87,-343,-18,-174,-223,-51,-134,1,1,5,9,-2,3,-1,-1,1,0,0,149,148,148,141,148,169,184,179,147,91,177,177,10.970190705,11.382720657,12.778799453,13.026528478,11.702076639,12.842796447,9.9360217138,12.047307721,10.372419243,9.7616853849,9.4889835216,10.1698078,9.808082237,11.077303414,10.646971368,9.9942062572,11.147731679,12.194226107,13.879284797,13.696242249,1.4812071839,1.2129128569,2.970717216,1.9492250642,1.0551052707,2.8485901893,-1.211709965,-0.146918387,-3.506865554,-3.934556864,-0.231438622,-0.046650494,0.0471542415,-0.047542075,0.095918661,0.3379683275,0.1938735944,0.1469183868,0.0987849452,0.1992180691,-9.442695797,-8.863593954,-17.49422361,-4.088618427,-16.54596902,-1.207029741,-8.627374952,-11.06785181,-2.617801047,-6.873023383,-9.67413442,-8.910244449,-17.44706936,-4.136160502,-16.45005036,-0.869061414,-8.433501357,-10.92093342,-2.519016102,-6.673805314 +040,4,9,15,000,Hawaii,Hawaii,1360301,1360304,1364004,1379562,1395199,1408822,1415335,1422999,1428885,1425763,1423102,1415615,1407006,3700,15558,15637,13623,6513,7664,5886,-3122,-2661,-7487,-8609,4643,19154,18894,19029,18956,18211,18406,17770,17284,16695,16420,2531,10075,10250,10339,10738,11078,10855,11288,11540,12456,13768,2112,9079,8644,8690,8218,7133,7551,6482,5744,4239,2652,2033,7437,10284,5873,4071,7434,9792,4814,4537,2778,2187,-357,-906,-3057,-763,-5708,-6829,-11424,-14416,-12928,-14463,-13375,1676,6531,7227,5110,-1637,605,-1632,-9602,-8391,-11685,-11188,-88,-52,-234,-177,-68,-74,-33,-2,-14,-41,-73,42880,43304,43299,42885,43716,43987,44258,44429,43565,42990,42347,42318,13.962849809,13.618470203,13.57265156,13.424182862,12.832175494,12.907958388,12.449871228,12.133955101,11.762356022,11.634576516,7.3444560838,7.3880236892,7.3744098208,7.6043930985,7.8059875969,7.6125115888,7.9085057072,8.1014719897,8.7757955443,9.7554719532,6.6183937255,6.2304465141,6.1982417393,5.8197897638,5.0261878975,5.2954467994,4.5413655204,4.0324831117,2.9865604778,1.8791045627,5.421411404,7.4125303044,4.1889843193,2.8829841967,5.2382841484,6.8670394729,3.372745081,3.1851281124,1.957222224,1.5496235591,-0.660454314,-2.203433016,-0.544218463,-4.042268188,-4.811977731,-8.011546052,-10.10001934,-9.075895137,-10.18981462,-9.477007363,4.7609570902,5.209097288,3.6447658559,-1.159283992,0.4263064178,-1.144506579,-6.727274256,-5.890767025,-8.2325924,-7.927383804 +050,4,9,15,001,Hawaii,Hawaii County,185079,185076,185361,187101,189199,191521,193812,196111,198583,200400,202263,202165,203340,285,1740,2098,2322,2291,2299,2472,1817,1863,-98,1175,588,2456,2470,2388,2469,2374,2385,2290,2288,2129,2078,354,1404,1534,1473,1572,1631,1748,1737,1863,2002,2227,234,1052,936,915,897,743,637,553,425,127,-149,173,657,731,479,260,495,911,512,562,488,382,-101,38,456,929,1128,1063,930,758,877,-709,943,72,695,1187,1408,1388,1558,1841,1270,1439,-221,1325,-21,-7,-25,-1,6,-2,-6,-6,-1,-4,-1,3644,3657,3662,3619,3732,3715,3791,3787,3916,3824,3931,3929,13.187922526,13.127823545,12.544652238,12.814889978,12.176763105,12.085311659,11.47918583,11.364341894,10.528450058,10.248948842,7.5390241152,8.1530693596,7.7379701618,8.1591766083,8.3657542643,8.8574946668,8.7071378981,9.2533955193,9.9004025438,10.983834971,5.6488984111,4.9747541855,4.8066820761,4.65571337,3.8110088402,3.2278169924,2.7720479319,2.1109463745,0.628047514,-0.73488613,3.5278766693,3.8851979803,2.5162849338,1.3494821362,2.5389628209,4.6162343486,2.5665253908,2.791416147,2.4132849358,1.88407048,0.2040476612,2.4235981929,4.8802269384,5.8546763449,5.4523585426,4.7125114646,3.7996606372,4.3559999305,-3.506186515,4.6509907399,3.7319243305,6.3087961733,7.3965118722,7.2041584811,7.9913213634,9.3287458132,6.366186028,7.1474160775,-1.09290158,6.53506122 +050,4,9,15,003,Hawaii,Honolulu County,953207,953203,956320,967510,978295,986494,988002,991755,993044,986973,981076,973491,963826,3117,11190,10785,8199,1508,3753,1289,-6071,-5897,-7585,-9665,3382,13775,13511,13760,13549,12995,13269,12770,12324,11996,11793,1754,7068,7133,7226,7465,7688,7373,7851,7901,8432,9226,1628,6707,6378,6534,6084,5307,5896,4919,4423,3564,2567,1608,5644,8250,4632,3282,5952,7082,3466,3083,1745,1376,-65,-1124,-3676,-2791,-7779,-7457,-11678,-14476,-13403,-12857,-13530,1543,4520,4574,1841,-4497,-1505,-4596,-11010,-10320,-11112,-12154,-54,-37,-167,-176,-79,-49,-11,20,0,-37,-78,35300,35715,35714,35343,36063,36229,36423,36654,35663,35141,34411,34383,14.320392134,13.887311421,14.006593074,13.724008557,13.127873774,13.370623423,12.898879151,12.524078415,12.274841435,12.174569263,7.3478425848,7.3316699258,7.3554972061,7.5614232695,7.7666097405,7.429467669,7.9302349424,8.0292716289,8.6279979146,9.5245125088,6.9725495496,6.5556414954,6.6510958683,6.1625852876,5.3612640339,5.9411557543,4.9686442086,4.4948067858,3.6468435208,2.6500567537,5.8674623018,8.4797808619,4.7150101105,3.3243926551,6.0128591539,7.1362389844,3.5009800421,3.1330520734,1.7855617126,1.4205212673,-1.168502414,-3.778384782,-2.841017534,-7.879479118,-7.533247767,-11.76743842,-14.62209668,-13.62059583,-13.15585498,-13.96777089,4.6989598873,4.7013960803,1.8739925763,-4.555086463,-1.520388613,-4.631199431,-11.12111664,-10.48754376,-11.37029327,-12.54724962 +050,4,9,15,005,Hawaii,Kalawao County,90,90,90,90,89,89,89,88,88,87,87,87,87,0,0,-1,0,0,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,1,0,0,0,0,0,-1,0,0,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,3,3,3,3,3,3,3,3,3,3,3,0,0,0,0,0,0,0,0,0,0,0,11.173184358,0,0,11.299435028,0,11.428571429,0,0,0,0,-11.17318436,0,0,-11.29943503,0,-11.42857143,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 +050,4,9,15,007,Hawaii,Kauai County,67091,67095,67208,67894,68680,69653,70316,71052,71574,71838,72292,72190,71851,113,686,786,973,663,736,522,264,454,-102,-339,196,891,881,843,909,892,888,804,812,755,755,165,575,495,515,582,542,569,586,592,673,760,31,316,386,328,327,350,319,218,220,82,-5,88,420,438,252,137,275,428,245,262,120,91,5,-47,-24,391,204,119,-220,-193,-24,-304,-426,93,373,414,643,341,394,208,52,238,-184,-335,-11,-3,-14,2,-5,-8,-5,-6,-4,0,1,1161,1160,1169,1174,1183,1252,1220,1179,1181,1176,1157,1158,13.190034196,12.901430726,12.187981176,12.988590331,12.619546149,12.452147575,11.212450841,11.267605634,10.45112886,10.483126332,8.5120871638,7.2488174909,7.4458010742,8.3161271424,7.6679305076,7.9789098762,8.1722589463,8.2148060778,9.3160393682,10.55255101,4.6779470326,5.6526132353,4.7421801016,4.6724631883,4.9516156414,4.4732376986,3.0401918947,3.052799556,1.1350894921,-0.069424678,6.217524537,6.4141051738,3.6433822732,1.9575763205,3.8905551469,6.001710768,3.4167294229,3.6356067439,1.6611065738,1.2635291341,-0.695770603,-0.351457818,5.6530256699,2.9149311633,1.6835493181,-3.084991516,-2.691546035,-0.333032679,-4.208136654,-5.91498254,5.5217539341,6.062647356,9.2964079432,4.8725074838,5.5741044649,2.9167192517,0.7251833877,3.3025740651,-2.54703008,-4.651453406 +050,4,9,15,009,Hawaii,Maui County,154834,154840,155025,156967,158936,161065,163116,163993,165596,166465,167384,167682,167902,185,1942,1969,2129,2051,877,1603,869,919,298,220,477,2032,2032,2038,2029,1950,1864,1906,1860,1815,1794,258,1028,1087,1125,1119,1216,1165,1113,1184,1349,1555,219,1004,945,913,910,734,699,793,676,466,239,164,716,865,510,392,712,1371,591,630,425,338,-196,227,187,708,739,-554,-456,-505,-378,-593,-362,-32,943,1052,1218,1131,158,915,86,252,-168,-24,-2,-5,-28,-2,10,-15,-11,-10,-9,0,5,2772,2769,2751,2746,2735,2788,2821,2806,2802,2846,2845,2845,13.025975025,12.864708471,12.737460195,12.517698446,11.922631294,11.311057104,11.479818467,11.142762147,10.833686498,10.691808906,6.5899125619,6.8818593049,7.0312280274,6.9035507942,7.4348305916,7.0694106903,6.7035875938,7.0930270871,8.0521449505,9.2674263374,6.4360624631,5.9828491657,5.706232168,5.6141476521,4.4878007025,4.2416464142,4.7762308732,4.0497350599,2.781541547,1.4243825689,4.5898612785,5.4763645803,3.1874900391,2.4184020655,4.3532889648,8.3194524089,3.5595869434,3.7741613724,2.5368136427,2.0143987794,1.4551655171,1.1839077185,4.4249861719,4.5591814449,-3.387250122,-2.767082639,-3.041609825,-2.264496823,-3.539601153,-2.157433012,6.0450267956,6.6602722988,7.612476211,6.9775835104,0.9660388433,5.5523697696,0.5179771187,1.5096645489,-1.002787511,-0.143034233 +040,4,8,16,000,Idaho,Idaho,1567582,1567658,1570819,1584272,1595910,1612053,1632248,1652495,1684036,1719745,1752074,1789060,1826913,3161,13453,11638,16143,20195,20247,31541,35709,32329,36986,37853,5973,22973,22365,22713,22440,23029,22601,22463,21636,21584,21656,2582,11882,11897,12297,12533,12889,13278,13683,14231,13755,14637,3391,11091,10468,10416,9907,10140,9323,8780,7405,7829,7019,187,1813,1756,2039,1589,3294,3618,1822,463,758,678,-381,524,-721,3535,8470,6771,18550,25035,24401,28466,30283,-194,2337,1035,5574,10059,10065,22168,26857,24864,29224,30961,-36,25,135,153,229,42,50,72,60,-67,-127,29021,28973,29314,29693,29736,29974,29673,30009,30439,30479,30624,30633,14.562495979,14.065232745,14.16038776,13.833488323,14.021797139,13.547603784,13.198851512,12.463783394,12.190445208,11.977965543,7.5319539119,7.4819617242,7.6665472763,7.7261635095,7.8477981382,7.9591647732,8.0398827069,8.1980080183,7.7686978239,8.0957462901,7.0305420668,6.5832710203,6.4938404838,6.1073248136,6.1739990008,5.5884390105,5.1589688056,4.265775376,4.4217473837,3.8822192533,1.1492536982,1.1043393114,1.2712116692,0.9795638567,2.0056363618,2.1687195473,1.0705741644,0.2667189735,0.4281114468,0.3750028001,0.3321615763,-0.453433168,2.2038907556,5.2214637298,4.1226969659,11.119333224,14.710112078,14.056608366,16.077335678,16.749571969,1.4814152746,0.6509061431,3.4751024248,6.2010275865,6.1283333278,13.288052771,15.780686243,14.323327339,16.505447125,17.124574769 +050,4,8,16,001,Idaho,Ada County,392365,392364,393369,401352,409032,416180,425774,433254,444929,456994,469161,481880,494399,1005,7983,7680,7148,9594,7480,11675,12065,12167,12719,12519,1307,5149,5033,5043,4984,5187,5059,4947,4866,4834,4912,485,2506,2553,2576,2659,2856,2978,3051,3208,3151,3426,822,2643,2480,2467,2325,2331,2081,1896,1658,1683,1486,86,898,593,713,826,1312,1242,603,85,164,145,138,4420,4524,3942,6311,3829,8309,9522,10391,10889,10923,224,5318,5117,4655,7137,5141,9551,10125,10476,11053,11068,-41,22,83,26,132,8,43,44,33,-17,-35,9714,9669,9885,10137,10270,10418,10272,11104,11350,11400,11292,11296,12.958006646,12.421271891,12.222313781,11.839126603,12.076439883,11.521516586,10.969894326,10.507960331,10.165702635,10.062697241,6.3066157809,6.3007166973,6.2432441603,6.3162595581,6.6493758061,6.7821854898,6.765544287,6.9275661201,6.6264230459,7.0184854944,6.6513908655,6.1205551936,5.9790696209,5.522867045,5.4270640771,4.7393310961,4.2043500388,3.5803942105,3.5392795894,3.0442117468,2.2599125983,1.4635037217,1.7280407944,1.9621024427,3.0546152163,2.828567622,1.3371429712,0.1835545886,0.3448852363,0.2970462337,11.123400539,11.165077297,9.5539085714,14.991317815,8.9147268774,18.92316294,21.11488453,22.439008589,22.899117914,22.376800075,13.383313138,12.628581018,11.281949366,16.953420258,11.969342094,21.751730562,22.452027501,22.622563178,23.24400315,22.673846308 +050,4,8,16,003,Idaho,Adams County,3976,3978,3962,3981,3907,3865,3884,3891,3944,4128,4215,4265,4447,-16,19,-74,-42,19,7,53,184,87,50,182,7,18,32,35,24,28,32,37,30,25,32,3,38,28,36,34,38,39,46,46,32,28,4,-20,4,-1,-10,-10,-7,-9,-16,-7,4,0,0,0,0,1,1,2,1,0,0,1,-22,40,-80,-41,27,17,57,192,101,58,178,-22,40,-80,-41,28,18,59,193,101,58,179,2,-1,2,0,1,-1,1,0,2,-1,-1,21,21,21,21,21,21,21,21,21,21,21,21,4.5322925847,8.1135902637,9.0066906845,6.1943476578,7.2025723473,8.1684747926,9.1674925669,7.1916576771,5.8962264151,7.3461891644,9.5681732343,7.0993914807,9.2640247041,8.7753258485,9.7749196141,9.9553286535,11.397423191,11.027208438,7.5471698113,6.4279155188,-5.03588065,1.014198783,-0.25733402,-2.580978191,-2.572347267,-1.786853861,-2.229930624,-3.835550761,-1.650943396,0.9182736455,0,0,0,0.2580978191,0.2572347267,0.5105296745,0.2477700694,0,0,0.2295684114,10.071761299,-20.28397566,-10.5506948,6.968641115,4.3729903537,14.550095724,47.57185332,24.21191418,13.679245283,40.863177227,10.071761299,-20.28397566,-10.5506948,7.2267389341,4.6302250804,15.060625399,47.819623389,24.21191418,13.679245283,41.092745638 +050,4,8,16,005,Idaho,Bannock County,82839,82842,83026,83657,83781,83494,83587,84263,84762,85571,86761,87822,88795,184,631,124,-287,93,676,499,809,1190,1061,973,356,1424,1289,1331,1267,1296,1229,1213,1124,1110,1092,118,655,656,669,719,691,703,720,796,738,734,238,769,633,662,548,605,526,493,328,372,358,10,99,105,175,209,419,378,242,106,97,79,-58,-233,-611,-1141,-668,-342,-403,80,755,591,533,-48,-134,-506,-966,-459,77,-25,322,861,688,612,-6,-4,-3,17,4,-6,-2,-6,1,1,3,1792,1792,1850,1961,1982,2006,2130,2025,1996,2018,2010,2010,17.08632554,15.396743869,15.913914213,15.166296587,15.442359249,14.542227481,14.24268932,13.044588353,12.716014732,12.365740557,7.8592297955,7.8357362128,7.9988043641,8.6066039825,8.2335418528,8.31829611,8.4540282858,9.2379824989,8.4544314166,8.3117706676,9.2270957446,7.5610076566,7.9151098491,6.5596926042,7.2088173965,6.2239313711,5.7886610346,3.8066058538,4.2615833157,4.0539698896,1.1878835874,1.2541955828,2.0923628755,2.5017805735,4.9925528746,4.4727111374,2.8414928405,1.2301835991,1.1112193054,0.8945911209,-2.795726019,-7.29822382,-13.64220595,-7.996121642,-4.075067024,-4.768525366,0.9393364762,8.7621567672,6.7704186547,6.0356590815,-1.607842431,-6.044028237,-11.54984307,-5.494341068,0.9174858505,-0.295814229,3.7808293167,9.9923403663,7.8816379602,6.9302502024 +050,4,8,16,007,Idaho,Bear Lake County,5986,5989,5972,5961,5897,5953,5931,5883,5940,6029,6026,6131,6143,-17,-11,-64,56,-22,-48,57,89,-3,105,12,31,66,75,100,69,81,86,80,82,73,73,26,62,66,76,55,66,54,57,76,46,62,5,4,9,24,14,15,32,23,6,27,11,0,1,1,3,1,2,7,3,1,3,4,-23,-16,-77,30,-38,-65,19,64,-10,76,-3,-23,-15,-76,33,-37,-63,26,67,-9,79,1,1,0,3,-1,1,0,-1,-1,0,-1,0,31,31,31,31,31,31,31,31,31,31,31,31,11.061761502,12.649687974,16.877637131,11.612251767,13.712544439,14.547915081,13.36786699,13.604313563,12.009541828,11.895062734,10.391351714,11.131725417,12.827004219,9.2561427129,11.173184358,9.1347373763,9.5246052302,12.608875985,7.5676564942,10.102656021,0.670409788,1.5179625569,4.0506329114,2.3561090542,2.5393600813,5.4131777045,3.8432617595,0.9954375778,4.4418853336,1.7924067134,0.167602447,0.1686625063,0.5063291139,0.1682935039,0.3385813442,1.1841326229,0.5012950121,0.165906263,0.4935428148,0.6517842594,-2.681639152,-12.98701299,5.0632911392,-6.395153147,-11.00389369,3.214074262,10.694293592,-1.65906263,12.503084643,-0.488838195,-2.514036705,-12.81835048,5.5696202532,-6.226859643,-10.66531234,4.3982068849,11.195588604,-1.493156367,12.996627457,0.1629460649 +050,4,8,16,009,Idaho,Benewah County,9285,9283,9291,9176,9129,9033,9035,8999,9033,9167,9222,9303,9430,8,-115,-47,-96,2,-36,34,134,55,81,127,31,104,108,121,106,111,117,93,86,104,94,12,118,107,109,131,139,135,134,122,110,126,19,-14,1,12,-25,-28,-18,-41,-36,-6,-32,0,3,1,2,1,7,2,6,3,3,3,-12,-105,-47,-112,27,-14,52,168,87,84,158,-12,-102,-46,-110,28,-7,54,174,90,87,161,1,1,-2,2,-1,-1,-2,1,1,0,-2,70,70,70,70,70,70,70,70,70,70,71,71,11.263334597,11.80005463,13.324523731,11.733451406,12.310080958,12.976929902,10.21978022,9.3534178041,11.228070175,10.035765761,12.779552716,11.690794865,12.003083361,14.500774851,15.415326605,14.973380657,14.725274725,13.268802001,11.875843455,13.452196658,-1.516218119,0.1092597651,1.32144037,-2.767323445,-3.105245647,-1.996450754,-4.505494505,-3.915384197,-0.647773279,-3.416430897,0.3249038826,0.1092597651,0.2202400617,0.1106929378,0.7763114118,0.2218278616,0.6593406593,0.3262820164,0.3238866397,0.3202903966,-11.37163589,-5.135208959,-12.33344345,2.9887093203,-1.552622824,5.7675244011,18.461538462,9.4621784763,9.0688259109,16.868627556,-11.04673201,-5.025949194,-12.11320339,3.0994022581,-0.776311412,5.9893522626,19.120879121,9.7884604927,9.3927125506,17.188917952 +050,4,8,16,011,Idaho,Bingham County,45607,45605,45764,45903,45519,45435,45226,45071,45313,45888,46054,46772,47202,159,139,-384,-84,-209,-155,242,575,166,718,430,222,744,743,774,702,723,691,649,576,612,609,62,323,338,307,352,374,361,415,408,377,392,160,421,405,467,350,349,330,234,168,235,217,-2,-31,-22,9,24,55,56,27,9,12,11,1,-250,-787,-567,-597,-564,-142,316,-9,474,200,-1,-281,-809,-558,-573,-509,-86,343,0,486,211,0,-1,20,7,14,5,-2,-2,-2,-3,2,323,323,323,323,324,323,323,323,324,321,338,338,16.232668245,16.254293277,17.019592321,15.486262009,16.013821057,15.29031687,14.232300084,12.52963825,13.18596083,12.961031775,7.0472471009,7.394281464,6.7506651714,7.7651912068,8.2837746548,7.9881394937,9.1007774038,8.8751604272,8.1227242367,8.3427330964,9.1854211439,8.8600118133,10.26892715,7.7210708022,7.7300464024,7.3021773765,5.1315226807,3.654477823,5.0632365932,4.6182986784,-0.676361177,-0.481284592,0.1979022363,0.529444855,1.2182021551,1.239157373,0.5920987708,0.1957755977,0.2585482516,0.2341073063,-5.45452562,-17.21686246,-12.46784089,-13.16994077,-12.49210937,-3.142149053,6.9297485773,-0.195775598,10.212655937,4.2564964777,-6.130886797,-17.69814705,-12.26993865,-12.64049591,-11.27390722,-1.90299168,7.5218473482,0,10.471204188,4.490603784 +050,4,8,16,013,Idaho,Blaine County,21376,21377,21296,21085,21131,21333,21471,21659,22069,22401,22736,23012,23426,-81,-211,46,202,138,188,410,332,335,276,414,60,242,223,222,222,232,201,196,193,195,186,39,108,84,86,106,111,113,115,110,104,136,21,134,139,136,116,121,88,81,83,91,50,5,49,46,63,37,103,233,125,121,165,126,-114,-398,-142,6,-10,-34,89,128,132,20,238,-109,-349,-96,69,27,69,322,253,253,185,364,7,4,3,-3,-5,-2,0,-2,-1,0,0,258,258,258,258,258,258,258,258,258,274,258,258,11.420211887,10.5647148,10.455915599,10.372862349,10.758172965,9.193194292,8.8149314144,8.5517424729,8.5249628399,8.0106809079,5.0966234869,3.979533826,4.0504898267,4.9528081488,5.1472293067,5.1683132089,5.172026085,4.8740501141,4.5466468479,5.8572720617,6.3235884005,6.585180974,6.4054257724,5.4200542005,5.6109436587,4.0248810831,3.6429053294,3.6776923588,3.978315992,2.1534088462,2.3123569524,2.1792685238,2.9672192916,1.7288103916,4.7762578252,10.656787413,5.6217674837,5.3614551255,7.2134300953,5.4265902924,-18.78200137,-6.727307182,0.2825923135,-0.467246052,-1.576628797,4.0706183681,5.7566899033,5.8488601369,0.8743551631,10.250226108,-16.46964442,-4.548038658,3.2498116051,1.2615643398,3.1996290285,14.727405781,11.378457387,11.210315262,8.0877852584,15.6768164 +050,4,8,16,015,Idaho,Boise County,7028,7027,7005,6986,6792,6722,6780,6963,7099,7370,7689,7903,8065,-22,-19,-194,-70,58,183,136,271,319,214,162,7,38,32,40,41,43,43,53,52,51,47,18,59,44,48,57,48,56,62,50,51,66,-11,-21,-12,-8,-16,-5,-13,-9,2,0,-19,0,9,2,4,0,2,16,19,10,10,9,-10,-8,-190,-66,71,183,133,260,305,203,175,-10,1,-188,-62,71,185,149,279,315,213,184,-1,1,6,0,3,3,0,1,2,1,-3,34,34,34,34,34,34,34,34,34,34,34,34,5.4320634694,4.6450863696,5.9197868877,6.0731743445,6.2577312086,6.1157730053,7.326007326,6.9061690683,6.5418163161,5.8867735471,8.4339932814,6.3869937582,7.1037442652,8.4431936009,6.9853743724,7.9647276348,8.5700463059,6.6405471811,6.5418163161,8.2665330661,-3.001929812,-1.741907389,-1.183957378,-2.370019256,-0.727643164,-1.848954629,-1.24403898,0.2656218872,0,-2.379759519,1.286541348,0.2903178981,0.5919786888,0,0.2910572655,2.2756364671,2.6263045131,1.3281094362,1.2827090816,1.127254509,-1.143592309,-27.58020032,-9.767648365,10.51696045,26.631739795,18.916228133,35.938903863,40.507337805,26.038994356,21.918837675,0.1429490387,-27.28988242,-9.175669676,10.51696045,26.92279706,21.1918646,38.565208377,41.835447241,27.321703438,23.046092184 +050,4,8,16,017,Idaho,Bonner County,40877,40877,40904,40795,40367,40553,41330,41656,42423,43715,44709,45774,46817,27,-109,-428,186,777,326,767,1292,994,1065,1043,96,393,377,399,410,391,419,449,397,420,418,97,378,423,387,418,419,458,434,444,470,502,-1,15,-46,12,-8,-28,-39,15,-47,-50,-84,1,20,7,-1,5,41,23,9,-5,-2,3,33,-144,-396,176,764,314,781,1261,1044,1122,1130,34,-124,-389,175,769,355,804,1270,1039,1120,1133,-6,0,7,-1,16,-1,2,7,2,-5,-6,353,353,353,353,353,353,353,353,353,348,404,406,9.6206807917,9.2900618516,9.8615916955,10.01428868,9.4232762153,9.9668169222,10.425131765,8.9794625893,9.2835118199,9.028955298,9.2534792348,10.42359725,9.5650024716,10.209689435,10.098088834,10.894515872,10.076853421,10.042522392,10.388691798,10.843386506,0.3672015569,-1.133535398,0.2965892239,-0.195400755,-0.674812619,-0.92769895,0.3482783441,-1.063059803,-1.105179979,-1.814431208,0.4896020759,0.1724945171,-0.024715769,0.1221254717,0.9881184778,0.5471045089,0.2089670064,-0.113091468,-0.044207199,0.0648011146,-3.525134947,-9.758261255,4.3499752842,18.660772077,7.567541513,18.577766149,29.278599457,23.613498598,24.800238719,24.408419825,-3.035532871,-9.585766738,4.3252595156,18.782897549,8.5556599908,19.124870657,29.487566463,23.500407129,24.75603152,24.473220939 +050,4,8,16,019,Idaho,Bonneville County,104234,104294,104682,105833,106788,107407,108285,109916,112162,114608,116661,119286,122134,388,1151,955,619,878,1631,2246,2446,2053,2625,2848,512,2017,1891,1943,1808,2012,1926,1885,1833,1808,1841,139,701,793,803,815,829,834,900,940,925,936,373,1316,1098,1140,993,1183,1092,985,893,883,905,5,39,-24,32,31,108,81,77,14,31,25,15,-199,-103,-557,-131,351,1073,1382,1144,1714,1927,20,-160,-127,-525,-100,459,1154,1459,1158,1745,1952,-5,-5,-16,4,-15,-11,0,2,2,-3,-9,1242,1242,1242,1242,1241,1241,1236,1238,1242,1242,1284,1285,19.162529986,17.787518636,18.142346927,16.764645884,18.441711999,17.345257072,16.624774,15.851670565,15.325475636,15.251429045,6.6598579674,7.4592820088,7.4978407526,7.5570721214,7.598498632,7.5108745576,7.937557878,8.1290618284,7.8407438959,7.7541214481,12.502672019,10.328236628,10.644506174,9.2075737626,10.843213367,9.8343825143,8.6872161221,7.722608737,7.4847317406,7.4973075967,0.3705199154,-0.225753806,0.2987931558,0.287446915,0.9899129702,0.7294734283,0.679102174,0.1210711336,0.2627708765,0.2071079447,-1.89060162,-0.968860084,-5.200868368,-1.214695028,3.217217153,9.6632714632,12.188561097,9.893241204,14.528686527,15.963880374,-1.520081704,-1.19461389,-4.902075212,-0.927248113,4.2071301231,10.392744891,12.867663271,10.014312338,14.791457404,16.170988319 +050,4,8,16,021,Idaho,Boundary County,10972,10972,10998,10822,10816,10856,10963,11310,11714,11995,12073,12340,12656,26,-176,-6,40,107,347,404,281,78,267,316,27,117,126,129,121,140,139,143,145,144,153,43,96,97,104,114,114,104,120,116,113,137,-16,21,29,25,7,26,35,23,29,31,16,1,5,11,13,6,25,39,22,5,8,3,40,-204,-44,3,94,292,331,234,46,229,299,41,-199,-33,16,100,317,370,256,51,237,302,1,2,-2,-1,0,4,-1,2,-2,-1,-2,73,73,73,73,73,73,73,73,73,77,67,67,10.724106324,11.64617802,11.904761905,11.091250745,12.571274637,12.074357192,12.062929689,12.04919395,11.796993405,12.241958713,8.7992667278,8.9657084758,9.5976375046,10.44960814,10.236609348,9.0340514246,10.122738201,9.6393551604,9.2573628804,10.961753881,1.9248395967,2.6804695443,2.3071244001,0.6416426051,2.3346652898,3.0403057679,1.9401914885,2.4098387901,2.5396305247,1.2802048328,0.4582951421,1.0167298272,1.1997046881,0.5499793758,2.244870471,3.3877692842,1.8558353368,0.4154894466,0.6553885225,0.2400384061,-18.6984418,-4.066919309,0.276854928,8.6163435538,26.220087101,28.752605976,19.739339491,3.8225029084,18.760496457,23.923827812,-18.24014665,-3.050189481,1.4765596161,9.1663229296,28.464957572,32.140375261,21.595174828,4.237992355,19.415884979,24.163866219 +050,4,8,16,023,Idaho,Butte County,2891,2893,2914,2832,2758,2665,2658,2565,2573,2582,2592,2620,2646,21,-82,-74,-93,-7,-93,8,9,10,28,26,14,27,31,25,25,33,30,24,32,23,21,0,27,25,30,33,24,23,29,41,23,25,14,0,6,-5,-8,9,7,-5,-9,0,-4,0,-1,-3,-2,1,2,1,0,0,0,0,7,-82,-78,-90,0,-105,1,14,19,29,30,7,-83,-81,-92,1,-103,2,14,19,29,30,0,1,1,4,0,1,-1,0,0,-1,0,18,18,18,18,18,18,18,18,18,18,18,18,9.397841977,11.091234347,9.219988936,9.3931993237,12.636415853,11.677695601,9.3113482056,12.369540008,8.8257866462,7.9756931257,9.397841977,8.9445438283,11.063986723,12.399023107,9.1901206203,8.9528999611,11.251212415,15.848473135,8.8257866462,9.4948727687,0,2.1466905188,-1.843997787,-3.005823784,3.4462952326,2.7247956403,-1.93986421,-3.478933127,0,-1.519179643,-0.348068221,-1.073345259,-0.737599115,0.3757279729,0.765843385,0.38925652,0,0,0,0,-28.54159415,-27.90697674,-33.19196017,0,-40.20677771,0.38925652,5.4316197866,7.3444143796,11.128165771,11.393847322,-28.88966237,-28.980322,-33.92955928,0.3757279729,-39.44093433,0.7785130401,5.4316197866,7.3444143796,11.128165771,11.393847322 +050,4,8,16,025,Idaho,Camas County,1117,1117,1115,1113,1081,1041,1052,1068,1078,1092,1098,1091,1130,-2,-2,-32,-40,11,16,10,14,6,-7,39,6,13,9,14,6,9,7,11,8,7,6,0,6,3,11,1,5,7,10,16,9,11,6,7,6,3,5,4,0,1,-8,-2,-5,0,-2,-3,-1,0,0,1,0,0,0,0,-9,-7,-36,-45,7,11,9,13,14,-6,45,-9,-9,-39,-46,7,11,10,13,14,-6,45,1,0,1,3,-1,1,0,0,0,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,11.669658887,8.2041932543,13.195098963,5.7333970377,8.4905660377,6.5237651445,10.138248848,7.3059360731,6.3956144358,5.4029716344,5.3859964093,2.7347310848,10.367577757,0.955566173,4.7169811321,6.5237651445,9.2165898618,14.611872146,8.222932846,9.9054479964,6.2836624776,5.4694621696,2.8275212064,4.7778308648,3.7735849057,0,0.9216589862,-7.305936073,-1.82731841,-4.502476362,-1.795332136,-2.734731085,-0.942507069,0,0,0.9319664492,0,0,0,0,-6.283662478,-32.81677302,-42.4128181,6.6889632107,10.377358491,8.3876980429,11.98156682,12.785388128,-5.481955231,40.522287258,-8.078994614,-35.5515041,-43.35532516,6.6889632107,10.377358491,9.3196644921,11.98156682,12.785388128,-5.481955231,40.522287258 +050,4,8,16,027,Idaho,Canyon County,188923,188930,189365,191392,193784,198661,202542,206956,211573,217037,223518,230270,237053,435,2027,2392,4877,3881,4414,4617,5464,6481,6752,6783,813,3153,2987,3094,3134,3189,3214,3068,2943,3002,3007,243,1252,1256,1436,1336,1418,1501,1530,1606,1621,1683,570,1901,1731,1658,1798,1771,1713,1538,1337,1381,1324,-7,33,53,41,-36,79,184,42,-67,-33,-24,-120,102,630,3124,2089,2551,2715,3865,5191,5412,5501,-127,135,683,3165,2053,2630,2899,3907,5124,5379,5477,-8,-9,-22,54,30,13,5,19,20,-8,-18,3335,3335,3326,3275,3351,3427,3360,3303,3337,3411,3505,3509,16.561744105,15.509792926,15.767814598,15.623013786,15.575167644,15.35855341,14.316044889,13.360420379,13.230847885,12.869043467,6.5763728572,6.5216939789,7.3182229357,6.6599701398,6.92555275,7.1727407181,7.1393574578,7.2908036454,7.1443052703,7.2027270218,9.9853712473,8.988098947,8.4495916625,8.9630436462,8.6496148943,8.1858126916,7.1766874315,6.0696167334,6.0865426146,5.6663164449,0.1733389012,0.2751988701,0.2089464766,-0.179460273,0.3858382703,0.8792700147,0.1959823616,-0.304161796,-0.145442365,-0.102712685,0.5357747855,3.2712318525,15.920702264,10.413680855,12.45915731,12.974011359,18.035043513,23.565729591,23.852547886,23.542603296,0.7091136867,3.5464307226,16.129648741,10.234220582,12.84499558,13.853281374,18.231025874,23.261567795,23.707105521,23.439890611 +050,4,8,16,029,Idaho,Caribou County,6963,6960,6971,6841,6770,6788,6793,6732,6870,6980,7019,7149,7123,11,-130,-71,18,5,-61,138,110,39,130,-26,25,101,85,99,89,81,85,89,97,95,92,10,61,76,78,49,67,57,84,68,50,67,15,40,9,21,40,14,28,5,29,45,25,0,7,14,14,4,5,15,9,11,15,11,-3,-179,-95,-19,-40,-79,96,97,-2,70,-61,-3,-172,-81,-5,-36,-74,111,106,9,85,-50,-1,2,1,2,1,-1,-1,-1,1,0,-1,79,79,79,79,42,41,41,42,42,32,32,32,14.6249638,12.489897877,14.603923883,13.10654591,11.977818854,12.498162035,12.85198556,13.858132724,13.410502541,12.892376682,8.8328989285,11.167438102,11.506121847,7.2159634784,9.9075785582,8.3811204235,12.129963899,9.7149796414,7.0581592321,9.3890134529,5.7920648711,1.3224597752,3.0978020357,5.8905824313,2.0702402957,4.1170416115,0.7220216606,4.1431530824,6.3523433089,3.5033632287,1.0136113524,2.0571596503,2.0652013571,0.5890582431,0.7393715342,2.2055580062,1.2996389892,1.5715408243,2.1174477696,1.5414798206,-25.9194903,-13.95929763,-2.80277327,-5.890582431,-11.68207024,14.11557124,14.007220217,-0.285734695,9.8814229249,-8.548206278,-24.90587895,-11.90213798,-0.737571913,-5.301524188,-10.94269871,16.321129246,15.306859206,1.285806129,11.998870695,-7.006726457 +050,4,8,16,031,Idaho,Cassia County,22952,22964,23080,23111,23265,23344,23503,23497,23477,23661,23769,24052,24277,116,31,154,79,159,-6,-20,184,108,283,225,103,392,416,375,374,366,359,384,384,394,384,70,201,176,204,173,206,204,191,215,197,201,33,191,240,171,201,160,155,193,169,197,183,2,0,44,32,-3,36,33,11,8,15,17,77,-158,-130,-126,-38,-204,-208,-19,-69,73,23,79,-158,-86,-94,-41,-168,-175,-8,-61,88,40,4,-2,0,2,-1,2,0,-1,0,-2,2,286,286,286,286,286,286,286,286,285,278,286,286,16.973003399,17.940313955,16.091312837,15.966870878,15.574468085,15.285051305,16.292587721,16.192283365,16.478116309,15.89107989,8.7029940898,7.5901328273,8.7536741831,7.3857450851,8.7659574468,8.6856558948,8.1038652467,9.0659919882,8.2390581544,8.3179871299,8.2700093092,10.350181128,7.3376386535,8.5811257925,6.8085106383,6.5993954102,8.1887224744,7.1262913768,8.2390581544,7.57309276,0,1.8975332068,1.3731253621,-0.128076504,1.5319148936,1.4050325712,0.4667147524,0.3373392368,0.6273394534,0.7035113493,-6.841159533,-5.606348111,-5.406681113,-1.622302389,-8.680851064,-8.855962873,-0.806143663,-2.909550917,3.0530520064,0.9518094726,-6.841159533,-3.708814904,-4.033555751,-1.750378893,-7.14893617,-7.450930302,-0.339428911,-2.57221168,3.6803914598,1.6553208219 +050,4,8,16,033,Idaho,Clark County,982,982,981,955,885,879,889,885,867,878,845,838,852,-1,-26,-70,-6,10,-4,-18,11,-33,-7,14,4,8,13,7,13,7,8,9,10,9,12,4,4,12,7,8,7,5,12,2,4,2,0,4,1,0,5,0,3,-3,8,5,10,1,6,17,5,2,1,2,2,1,1,2,-2,-36,-91,-11,4,-5,-24,11,-42,-13,2,-1,-30,-74,-6,6,-4,-22,13,-41,-12,4,0,0,3,0,-1,0,1,1,0,0,0,2,2,2,2,2,2,2,2,2,2,2,2,8.2644628099,14.130434783,7.9365079365,14.705882353,7.8917700113,9.1324200913,10.315186246,11.607661056,10.695187166,14.201183432,4.132231405,13.043478261,7.9365079365,9.0497737557,7.8917700113,5.7077625571,13.753581662,2.3215322113,4.7534165181,2.3668639053,4.132231405,1.0869565217,0,5.6561085973,0,3.4246575342,-3.438395415,9.286128845,5.9417706477,11.834319527,6.1983471074,18.47826087,5.6689342404,2.2624434389,1.1273957159,2.2831050228,2.2922636103,1.1607661056,1.1883541295,2.3668639053,-37.19008264,-98.91304348,-12.47165533,4.5248868778,-5.636978579,-27.39726027,12.607449857,-48.75217644,-15.44860368,2.3668639053,-30.99173554,-80.43478261,-6.802721088,6.7873303167,-4.509582864,-25.11415525,14.899713467,-47.59141033,-14.26024955,4.7337278107 +050,4,8,16,035,Idaho,Clearwater County,8761,8761,8726,8609,8579,8570,8564,8554,8660,8651,8759,8761,8846,-35,-117,-30,-9,-6,-10,106,-9,108,2,85,16,52,72,61,71,52,70,65,72,68,64,40,122,94,107,98,108,111,127,106,95,99,-24,-70,-22,-46,-27,-56,-41,-62,-34,-27,-35,0,4,2,2,2,7,6,7,4,3,2,-11,-49,-9,35,18,40,141,46,139,26,119,-11,-45,-7,37,20,47,147,53,143,29,121,0,-2,-1,0,1,-1,0,0,-1,0,-1,607,607,607,607,644,681,687,719,726,743,743,740,5.9994231324,8.3779380963,7.1141174413,8.2876152679,6.075476107,8.1329150691,7.5096759286,8.2711085583,7.7625570776,7.2698358607,14.075569657,10.937863626,12.478861741,11.439243609,12.61829653,12.89647961,14.67275143,12.176909822,10.844748858,11.245527347,-8.076146524,-2.559925529,-5.3647443,-3.151628341,-6.542820423,-4.76356454,-7.163075501,-3.905801264,-3.082191781,-3.975691486,0.4614940871,0.2327205027,0.2332497522,0.2334539512,0.8178525529,0.6971070059,0.8087343308,0.459506031,0.3424657534,0.2271823706,-5.653302567,-1.047242262,4.081870663,2.1010855609,4.6734431592,16.382014639,5.3145398879,15.967834578,2.9680365297,13.517351054,-5.19180848,-0.814521759,4.3151204152,2.3345395121,5.4912957121,17.079121645,6.1232742187,16.427340609,3.3105022831,13.744533424 +050,4,8,16,037,Idaho,Custer County,4368,4366,4357,4325,4327,4226,4134,4061,4089,4138,4216,4273,4249,-9,-32,2,-101,-92,-73,28,49,78,57,-24,6,46,35,38,37,35,41,42,31,32,27,14,44,40,37,38,41,54,43,54,35,38,-8,2,-5,1,-1,-6,-13,-1,-23,-3,-11,0,2,2,2,1,1,2,0,0,0,0,0,-35,5,-107,-93,-69,39,51,101,60,-12,0,-33,7,-105,-92,-68,41,51,101,60,-12,-1,-1,0,3,1,1,0,-1,0,0,-1,21,21,21,21,21,21,21,21,21,21,21,21,10.59663672,8.0906148867,8.8857710745,8.8516746411,8.5417937767,10.061349693,10.210283214,7.4215944458,7.5391683355,6.3365407181,10.135913384,9.2464170134,8.6519349936,9.0909090909,10.006101281,13.251533742,10.453385195,12.927938712,8.2459653669,8.9180943441,0.4607233356,-1.155802127,0.2338360809,-0.23923445,-1.464307505,-3.190184049,-0.243101981,-5.506344266,-0.706797031,-2.581553626,0.4607233356,0.4623208507,0.4676721618,0.2392344498,0.2440512508,0.490797546,0,0,0,0,-8.062658374,1.1558021267,-25.02046066,-22.24880383,-16.8395363,9.5705521472,12.398201045,24.180033517,14.135940629,-2.816240319,-7.601935038,1.6181229773,-24.5527885,-22.00956938,-16.59548505,10.061349693,12.398201045,24.180033517,14.135940629,-2.816240319 +050,4,8,16,039,Idaho,Elmore County,27038,27040,27125,26237,26314,26296,26257,25861,26178,26907,27309,27373,27448,85,-888,77,-18,-39,-396,317,729,402,64,75,133,465,476,445,498,462,459,457,447,426,419,22,171,176,175,185,179,199,196,211,201,211,111,294,300,270,313,283,260,261,236,225,208,49,71,261,158,137,224,152,64,-12,36,30,-78,-1261,-494,-454,-501,-917,-93,402,177,-197,-163,-29,-1190,-233,-296,-364,-693,59,466,165,-161,-133,3,8,10,8,12,14,-2,2,1,0,0,632,629,661,685,702,639,605,635,665,726,701,699,17.428132379,18.115735191,16.916935944,18.952295778,17.728999578,17.640615692,17.217669775,16.489597167,15.580995574,15.286112986,6.4090551329,6.6982550284,6.6527276183,7.0405114836,6.869027975,7.6481100713,7.3843835358,7.7836800944,7.3515965034,7.6977800478,11.019077246,11.417480162,10.264208325,11.911784294,10.859971603,9.9925056208,9.8332862391,8.7059170725,8.229399071,7.5883329381,2.661069675,9.9332077411,6.0064626497,5.2137841798,8.5958785832,5.8417725168,2.411227277,-0.442673749,1.3167038514,1.0944710968,-47.26209662,-18.800784,-17.25907622,-19.06646623,-35.18937795,-3.574242395,15.145521334,6.5294378043,-7.205296075,-5.946626293,-44.60102695,-8.867576259,-11.25261357,-13.85268205,-26.59349937,2.2675301216,17.556748611,6.0867640549,-5.888592224,-4.852155196 +050,4,8,16,041,Idaho,Franklin County,12786,12786,12782,12813,12801,12809,12924,12974,13345,13501,13718,13898,14215,-4,31,-12,8,115,50,371,156,217,180,317,60,221,199,185,178,206,200,191,194,210,203,35,87,93,101,112,96,82,120,118,104,98,25,134,106,84,66,110,118,71,76,106,105,0,-2,-2,0,-8,-9,-8,-11,-10,-10,-7,-31,-101,-119,-77,60,-52,263,95,152,85,220,-31,-103,-121,-77,52,-61,255,84,142,75,213,2,0,3,1,-3,1,-2,1,-1,-1,-1,102,102,102,102,102,102,102,102,102,102,102,102,17.268997851,15.53837745,14.447481453,13.834376093,15.908564368,15.198145826,14.229307904,14.254748521,15.208574739,14.441717355,6.798202774,7.2616537831,7.8875439282,8.7047759686,7.4136998996,6.2312397887,8.9398793116,8.670414049,7.5318655852,6.9718635507,10.470795077,8.2767236667,6.5599375244,5.1296001244,8.4948644683,8.9669060375,5.2894285927,5.5843344722,7.6767091541,7.4698538043,-0.156280524,-0.156164597,0,-0.621769712,-0.695034366,-0.607925833,-0.819488937,-0.734780852,-0.724217845,-0.497990254,-7.892166439,-9.29179355,-6.013276064,4.6632728403,-4.015754112,19.985561761,7.077404455,11.168668944,6.1558516802,15.651122257,-8.048446962,-9.447958148,-6.013276064,4.0415031283,-4.710788478,19.377635928,6.2579155181,10.433888093,5.4316338355,15.153132003 +050,4,8,16,043,Idaho,Fremont County,13242,13243,13232,13116,12973,12881,12815,12824,12932,13140,13162,13105,13218,-11,-116,-143,-92,-66,9,108,208,22,-57,113,60,203,208,179,179,203,178,177,179,178,180,41,107,110,91,95,108,118,104,106,106,97,19,96,98,88,84,95,60,73,73,72,83,1,-1,14,5,2,15,21,4,0,4,2,-32,-212,-260,-188,-156,-101,27,131,-51,-131,27,-31,-213,-246,-183,-154,-86,48,135,-51,-127,29,1,1,5,3,4,0,0,0,0,-2,1,460,460,460,460,449,446,457,449,457,449,457,458,15.409139214,15.945417609,13.846986927,13.932129514,15.835250985,13.822022053,13.577784597,13.611132233,13.553127498,13.676252707,8.1220586003,8.432672774,7.0395296666,7.3941469489,8.4246655486,9.1629134959,7.9779073335,8.0602235571,8.0709635665,7.3699806253,7.2870806133,7.512744835,6.80745726,6.5379825654,7.4105854362,4.6591085572,5.599877263,5.5509086761,5.4821639319,6.3062720814,-0.07590709,1.0732492621,0.3867873443,0.1556662516,1.1700924373,1.630687995,0.3068425898,0,0.3045646629,0.1519583634,-16.09230302,-19.93177201,-14.54320415,-12.14196762,-7.878622411,2.0965988508,10.049094814,-3.878032089,-9.974492709,2.051437906,-16.16821011,-18.85852275,-14.1564168,-11.98630137,-6.708529974,3.7272868458,10.355937404,-3.878032089,-9.669928047,2.2033962694 +050,4,8,16,045,Idaho,Gem County,16719,16719,16686,16696,16638,16582,16665,16706,17005,17351,17622,18174,18703,-33,10,-58,-56,83,41,299,346,271,552,529,40,179,216,205,188,188,225,191,202,192,190,32,206,175,198,210,193,217,220,228,197,211,8,-27,41,7,-22,-5,8,-29,-26,-5,-21,3,24,14,7,8,23,23,12,5,7,4,-47,14,-117,-70,99,26,269,361,291,552,549,-44,38,-103,-63,107,49,292,373,296,559,553,3,-1,4,0,-2,-3,-1,2,1,-2,-3,151,151,151,151,151,151,151,151,151,148,145,147,10.72434246,12.959740805,12.341962673,11.309291064,11.267267987,13.348758565,11.118872977,11.551768507,10.727455582,10.304525856,12.341980708,10.499790004,11.920529801,12.632718742,11.56692937,12.874136039,12.807078822,13.0386298,11.006816404,11.443447135,-1.617638248,2.459950801,0.4214328718,-1.323427678,-0.299661383,0.4746225268,-1.688205845,-1.486861293,-0.279360822,-1.138921279,1.437900665,0.8399832003,0.4214328718,0.4812464282,1.3784423601,1.3645397645,0.6985679357,0.285934864,0.3911051514,0.2169373864,0.8387753879,-7.019859603,-4.214328718,5.9554245496,1.5582391897,15.959182463,21.015252067,16.641409087,30.841434797,29.77465629,2.276676053,-6.179876402,-3.792895846,6.4366709778,2.9366815498,17.323722227,21.713820002,16.927343951,31.232539949,29.991593676 +050,4,8,16,047,Idaho,Gooding County,15464,15471,15470,15352,15246,15162,15080,15181,15150,15155,15187,15290,15618,-1,-118,-106,-84,-82,101,-31,5,32,103,328,58,230,196,204,204,196,218,206,199,181,188,52,161,137,145,150,132,135,162,139,125,119,6,69,59,59,54,64,83,44,60,56,69,2,29,42,20,-9,-7,30,19,33,38,40,-8,-217,-212,-166,-129,45,-144,-56,-62,10,219,-6,-188,-170,-146,-138,38,-114,-37,-29,48,259,-1,1,5,3,2,-1,0,-2,1,-1,0,52,52,52,52,47,47,47,47,47,31,31,31,14.924404646,12.811294856,13.417521705,13.491171219,12.953967152,14.374732122,13.595116317,13.117131369,11.877809496,12.16513524,10.447083252,8.9548336493,9.5369639569,9.9199788374,8.7241003272,8.9017836537,10.691305065,9.1622173884,8.2029071103,7.7002717743,4.4773213938,3.8564612066,3.880557748,3.5711923815,4.2298668253,5.4729484686,2.9038112523,3.9549139806,3.6749023854,4.4648634658,1.8817727597,2.7452774691,1.3154433044,-0.59519873,-0.462641684,1.9781741453,1.2539184953,2.1752026893,2.4936837615,2.5883266468,-14.08085134,-13.85711484,-10.91817943,-8.5311818,2.9741251115,-9.495235897,-3.695759776,-4.086744447,0.6562325688,14.171088391,-12.19907858,-11.11183737,-9.602736122,-9.12638053,2.5114834275,-7.517061752,-2.44184128,-1.911541757,3.1499163303,16.759415038 +050,4,8,16,049,Idaho,Idaho County,16267,16269,16311,16465,16448,16256,16285,16312,16247,16392,16469,16623,16823,42,154,-17,-192,29,27,-65,145,77,154,200,38,166,154,160,157,148,152,164,144,152,152,21,169,163,177,199,202,200,177,201,183,192,17,-3,-9,-17,-42,-54,-48,-13,-57,-31,-40,0,-1,0,2,4,12,9,7,2,2,2,27,158,-6,-176,70,72,-25,153,134,184,239,27,157,-6,-174,74,84,-16,160,136,186,241,-2,0,-2,-1,-3,-3,-1,-2,-2,-1,-1,524,524,524,524,524,524,522,520,519,520,524,524,10.129362948,9.3580044359,9.7847358121,9.6493654159,9.0805902384,9.3368960963,10.049327492,8.7641885518,9.1865103348,9.0892782396,10.312423725,9.9049007991,10.824363992,12.230724317,12.393778569,12.2853896,10.845920525,12.23334652,11.060074943,11.481193566,-0.183060776,-0.546896363,-1.03962818,-2.581358901,-3.31318833,-2.948493504,-0.796593033,-3.469157968,-1.873564608,-2.391915326,-0.061020259,0,0.1223091977,0.2458437049,0.7362640734,0.552842532,0.42893471,0.121724841,0.120875136,0.1195957663,9.6412008787,-0.364597575,-10.76320939,4.3022648351,4.4175844403,-1.5356737,9.3752872331,8.1555643468,11.120512511,14.291694074,9.58018062,-0.364597575,-10.6409002,4.54810854,5.1538485137,-0.982831168,9.8042219431,8.2772891878,11.241387647,14.41128984 +050,4,8,16,051,Idaho,Jefferson County,26140,26144,26222,26315,26642,26809,26948,27133,27827,28448,29418,29918,30581,78,93,327,167,139,185,694,621,970,500,663,135,498,500,481,473,467,455,452,485,454,439,41,143,141,141,145,171,178,152,181,159,163,94,355,359,340,328,296,277,300,304,295,276,-1,3,9,11,5,11,24,8,0,5,5,-14,-265,-42,-184,-199,-121,394,313,666,200,384,-15,-262,-33,-173,-194,-110,418,321,666,205,389,-1,0,1,0,5,-1,-1,0,0,0,-2,111,111,111,111,120,119,119,119,119,141,175,175,18.958067648,18.883244897,17.997792371,17.597708205,17.27039071,16.557496361,16.063971568,16.762865932,15.302683025,14.512636573,5.4437824771,5.3250750609,5.2758601336,5.3946462786,6.323847562,6.4774381368,5.4020435362,6.2558324405,5.3593096939,5.3885188185,13.51428517,13.558169836,12.721932237,12.203061927,10.946543148,10.080058224,10.661928032,10.507033491,9.9433733315,9.124117754,0.1142052268,0.3398984081,0.4115919253,0.1860222855,0.4067972116,0.8733624454,0.2843180809,0,0.1685317514,0.1652919883,-10.08812837,-1.586192571,-6.884810387,-7.403686962,-4.474769327,14.337700146,11.123944913,23.018698372,6.7412700553,12.694424701,-9.97392314,-1.246294163,-6.473218462,-7.217664676,-4.067972116,15.211062591,11.408262994,23.018698372,6.9098018067,12.85971669 +050,4,8,16,053,Idaho,Jerome County,22374,22355,22438,22516,22572,22759,22918,22960,23438,23791,24078,24486,24578,83,78,56,187,159,42,478,353,287,408,92,114,397,397,414,390,398,415,379,372,350,356,22,152,136,166,174,175,178,172,170,147,170,92,245,261,248,216,223,237,207,202,203,186,5,25,80,128,14,58,185,105,121,94,90,-14,-192,-292,-189,-68,-242,56,41,-34,111,-185,-9,-167,-212,-61,-54,-184,241,146,87,205,-95,0,0,7,0,-3,3,0,0,-2,0,1,106,106,106,106,107,107,106,108,107,116,152,152,17.662499444,17.610007097,18.265646026,17.076427962,17.350364009,17.888702099,16.049461136,15.542417849,14.413969195,14.511658242,6.7624683009,6.0326472676,7.3239063775,7.6187140136,7.6289288984,7.6727445148,7.2836604629,7.1027178341,6.053867062,6.9297244415,10.900031143,11.57735983,10.941739648,9.4577139479,9.7214351105,10.215957584,8.7658006733,8.4397000146,8.3601021333,7.5819338008,1.1122480758,3.5486160397,5.6473494959,0.6129999781,2.5284450063,7.9744816587,4.4464206314,5.0554638701,3.8711802982,3.6686776455,-8.542065222,-12.95244855,-8.33866449,-2.977428465,-10.54971882,2.4138971507,1.7362213894,-1.420543567,4.5712873734,-7.541170716,-7.429817146,-9.403832505,-2.691314994,-2.364428487,-8.021273813,10.388378809,6.1826420208,3.6349203033,8.4424676715,-3.87249307 +050,4,8,16,055,Idaho,Kootenai County,138494,138466,138860,140986,142173,144019,146687,149566,153221,157594,161279,165656,170628,394,2126,1187,1846,2668,2879,3655,4373,3685,4377,4972,416,1735,1683,1712,1792,1805,1782,1851,1758,1762,1785,253,1235,1227,1242,1270,1342,1338,1452,1539,1523,1675,163,500,456,470,522,463,444,399,219,239,110,-8,30,5,-25,-33,-11,-55,-58,-75,-74,-55,237,1590,743,1399,2142,2407,3255,4016,3534,4225,4945,229,1620,748,1374,2109,2396,3200,3958,3459,4151,4890,2,6,-17,2,37,20,11,16,7,-13,-28,1488,1488,1488,1488,1486,1486,1485,1470,1484,1468,1467,1467,12.399676965,11.887314194,11.963996198,12.328606909,12.185530611,11.770650655,11.910622074,11.026333368,10.778901005,10.61602693,8.8262830271,8.6665089225,8.6794878962,8.7373497623,9.0598238668,8.8378959467,9.343178418,9.652745764,9.3168366801,9.9618179872,3.5733939381,3.2208052719,3.2845083021,3.5912571464,3.1257067439,2.9327547088,2.5674436562,1.3735876038,1.4620643247,0.6542089424,0.2144036363,0.0353158473,-0.174707888,-0.227033498,-0.074260851,-0.363291687,-0.373212361,-0.470406714,-0.452689373,-0.327104471,11.363392723,5.2479349058,9.7766534355,14.736537946,16.249624476,21.500262561,25.841738655,22.165564347,25.8461162,29.40966564,11.577796359,5.2832507531,9.601945547,14.509504448,16.175363625,21.136970874,25.468526294,21.695157633,25.393426828,29.082561169 +050,4,8,16,057,Idaho,Latah County,37244,37243,37258,37872,38127,38262,38570,38860,39157,39903,39996,40372,40830,15,614,255,135,308,290,297,746,93,376,458,104,480,433,454,429,462,426,462,398,413,394,82,216,217,231,248,207,224,216,235,188,229,22,264,216,223,181,255,202,246,163,225,165,3,118,69,143,136,281,339,211,76,91,75,-7,232,-24,-228,0,-246,-247,288,-149,60,215,-4,350,45,-85,136,35,92,499,-73,151,290,-3,0,-6,-3,-9,0,3,1,3,0,3,3086,3086,3193,3256,3138,3272,3207,2836,2960,2773,2774,2774,12.777851724,11.394886775,11.886528165,11.167221991,11.933359163,10.920696771,11.687326081,9.9625777544,10.277722477,9.704194478,5.7500332757,5.7106014553,6.0479912029,6.4556434819,5.3467648198,5.7423382083,5.4642044017,5.8824265635,4.6784789966,5.6402551661,7.027818448,5.6842853195,5.8385369621,4.711578509,6.5865943433,5.1783585629,6.2231216797,4.0801511909,5.59924348,4.0639393118,3.1412218821,1.815813366,3.7439945542,3.5401915868,7.2581686685,8.6904136278,5.3377181887,1.9024017823,2.2645829186,1.8472451417,6.1759616664,-0.631587258,-5.969445863,0,-6.354126308,-6.331953292,7.285605869,-3.729708757,1.4931315947,5.295436073,9.3171835485,1.1842261082,-2.225451308,3.5401915868,0.9040423608,2.3584603356,12.623324058,-1.827306975,3.7577145132,7.1426812147 +050,4,8,16,059,Idaho,Lemhi County,7936,7936,7952,7985,7769,7718,7728,7744,7715,7837,7974,8067,8054,16,33,-216,-51,10,16,-29,122,137,93,-13,30,78,69,53,67,67,82,78,76,79,75,37,86,95,85,101,104,107,102,101,106,103,-7,-8,-26,-32,-34,-37,-25,-24,-25,-27,-28,0,2,1,2,1,-2,-3,-3,-3,-3,-3,22,39,-196,-20,45,54,-1,149,166,122,20,22,41,-195,-18,46,52,-4,146,163,119,17,1,0,5,-1,-2,1,0,0,-1,1,-2,80,80,80,80,80,80,80,80,80,80,80,80,9.7885423856,8.7596800812,6.844450184,8.675385213,8.6608066184,10.608706902,10.030864198,9.6135601796,9.84975999,9.3046337076,10.792495451,12.060429097,10.976948408,13.0778195,13.443640124,13.843068763,13.117283951,12.775915502,13.216133658,12.778363625,-1.003953065,-3.300749016,-4.132498224,-4.402434287,-4.782833506,-3.23436186,-3.086419753,-3.162355322,-3.366373667,-3.473729917,0.2509882663,0.1269518852,0.258281139,0.1294833614,-0.258531541,-0.388123423,-0.385802469,-0.379482639,-0.374041519,-0.372185348,4.8942711928,-24.88256951,-2.58281139,5.8267512625,6.9803516029,-0.129374474,19.161522634,20.99803934,15.211021757,2.4812356554,5.1452594591,-24.75561762,-2.324530251,5.9562346239,6.721820062,-0.517497898,18.775720165,20.618556701,14.836980238,2.1090503071 +050,4,8,16,061,Idaho,Lewis County,3821,3821,3820,3805,3820,3805,3813,3792,3850,3883,3835,3845,3838,-1,-15,15,-15,8,-21,58,33,-48,10,-7,10,40,42,40,39,41,45,34,34,34,34,2,41,36,44,41,38,46,42,52,39,41,8,-1,6,-4,-2,3,-1,-8,-18,-5,-7,0,-1,-2,0,5,11,11,6,3,4,2,-9,-15,13,-11,6,-36,49,35,-32,11,-1,-9,-16,11,-11,11,-25,60,41,-29,15,1,0,2,-2,0,-1,1,-1,0,-1,0,-1,74,74,74,74,74,74,74,74,74,72,74,74,10.491803279,11.016393443,10.491803279,10.23890785,10.782380013,11.777021722,8.7934824777,8.8105726872,8.8541666667,8.8507093583,10.754098361,9.4426229508,11.540983607,10.763980047,9.993425378,12.038733316,10.862537178,13.474993522,10.15625,10.672914226,-0.262295082,1.5737704918,-1.049180328,-0.525072197,0.7889546351,-0.261711594,-2.069054701,-4.664420834,-1.302083333,-1.822204868,-0.262295082,-0.524590164,0,1.3126804936,2.8928336621,2.8788275321,1.5517910255,0.7774034724,1.0416666667,0.5206299623,-3.93442623,3.4098360656,-2.885245902,1.5752165923,-9.467455621,12.823868097,9.0521143153,-8.292303706,2.8645833333,-0.260314981,-4.196721311,2.8852459016,-2.885245902,2.8878970858,-6.574621959,15.702695629,10.603905341,-7.514900233,3.90625,0.2603149811 +050,4,8,16,063,Idaho,Lincoln County,5208,5207,5208,5135,5267,5333,5336,5312,5304,5361,5360,5325,5358,1,-73,132,66,3,-24,-8,57,-1,-35,33,21,92,77,74,73,67,74,69,65,58,63,15,46,34,33,52,30,45,25,42,34,37,6,46,43,41,21,37,29,44,23,24,26,-1,-1,19,28,6,14,30,10,14,19,15,-4,-118,69,-3,-25,-75,-68,4,-37,-78,-8,-5,-119,88,25,-19,-61,-38,14,-23,-59,7,0,0,1,0,1,0,1,-1,-1,0,0,37,37,37,37,37,37,37,37,37,37,37,37,17.789809533,14.804845222,13.962264151,13.684506514,12.584522915,13.941220799,12.9395218,12.12573454,10.856340664,11.794439764,8.8949047665,6.5372043838,6.2264150943,9.747867654,5.6348610068,8.4777694047,4.6882325363,7.8350900103,6.3640617688,6.9268931948,8.8949047665,8.2676408383,7.7358490566,3.9366388602,6.9496619083,5.4634513941,8.2512892639,4.2906445294,4.4922788956,4.8675465693,-0.193367495,3.6531436262,5.2830188679,1.1247539601,2.6296018032,5.6518462698,1.8752930145,2.6116966701,3.5563874591,2.8081999438,-22.8173644,13.266679485,-0.566037736,-4.686474834,-14.08715252,-12.81085154,0.7501172058,-6.9023412,-14.59990641,-1.497706637,-23.0107319,16.919823111,4.7169811321,-3.561720874,-11.45755071,-7.159005275,2.6254102203,-4.290644529,-11.04351895,1.3104933071 +050,4,8,16,065,Idaho,Madison County,37536,37542,37588,37937,37712,37607,38005,38120,39111,39540,39451,40205,40318,46,349,-225,-105,398,115,991,429,-89,754,113,256,1017,1079,1104,1097,1155,1066,1115,1093,1121,1131,40,127,145,125,124,127,123,137,152,155,150,216,890,934,979,973,1028,943,978,941,966,981,-9,64,1,23,27,136,122,86,21,35,29,-168,-607,-1192,-1132,-603,-1059,-76,-631,-1050,-242,-891,-177,-543,-1191,-1109,-576,-923,46,-545,-1029,-207,-862,7,2,32,25,1,10,2,-4,-1,-5,-6,1036,1036,1047,1046,944,835,638,636,634,630,624,624,26.931479643,28.526484157,29.315312205,29.016558218,30.344827586,27.605495203,28.35310422,27.674038815,28.14602792,28.091352781,3.3631247931,3.8334941638,3.319215603,3.279902661,3.3366174056,3.1852494465,3.4837446441,3.8485397071,3.8917344582,3.7256436049,23.568354849,24.692989993,25.996096602,25.736655557,27.008210181,24.420245756,24.869359576,23.825499107,24.254293462,24.365709176,1.6948030453,0.0264378908,0.6107356709,0.7141723536,3.5730706076,3.1593531095,2.1868761999,0.5317061437,0.8787787486,0.720291097,-16.07414763,-31.51396582,-30.0588165,-15.94984923,-27.8226601,-1.968121609,-16.0455684,-26.58530719,-6.076127348,-22.13032301,-14.37934459,-31.48752793,-29.44808083,-15.23567688,-24.24958949,1.1912315003,-13.8586922,-26.05360104,-5.197348599,-21.41003192 +050,4,8,16,067,Idaho,Minidoka County,20069,20055,20084,20208,20156,20399,20340,20431,20609,20683,20667,20910,21216,29,124,-52,243,-59,91,178,74,-16,243,306,99,321,321,332,334,308,322,306,320,286,306,27,176,200,170,185,166,153,169,200,204,209,72,145,121,162,149,142,169,137,120,82,97,2,40,82,79,-2,1,4,-24,-24,-19,-11,-47,-60,-263,8,-214,-49,6,-39,-110,180,221,-45,-20,-181,87,-216,-48,10,-63,-134,161,210,2,-1,8,-6,8,-3,-1,0,-2,0,-1,82,82,82,82,82,82,82,82,82,82,82,82,15.933684106,15.905262115,16.372827025,16.397064238,15.108778298,15.692007797,14.821272886,15.477629988,13.757606369,14.527845036,8.7362255535,9.9098206322,8.3836764887,9.0822062397,8.1430428491,7.4561403509,8.1856049598,9.6735187424,9.8131178296,9.922613113,7.1974585526,5.9954414825,7.9891505363,7.3148579985,6.9657354492,8.2358674464,6.635667926,5.8041112455,3.9444885393,4.6052319233,1.9855058076,4.0630264592,3.8959437801,-0.098186013,0.049054475,0.1949317739,-1.162452775,-1.160822249,-0.913966857,-0.522242795,-2.978258711,-13.03141413,0.3945259524,-10.50590343,-2.403669275,0.2923976608,-1.88898576,-5.320435308,8.658633379,10.492332526,-0.992752904,-8.968387672,4.2904697325,-10.60408945,-2.3546148,0.4873294347,-3.051438535,-6.481257557,7.7446665224,9.9700897308 +050,4,8,16,069,Idaho,Nez Perce County,39265,39270,39317,39444,39512,39819,39873,40039,40200,40376,40408,40601,40755,47,127,68,307,54,166,161,176,32,193,154,116,448,480,504,498,476,490,468,476,441,444,96,490,500,519,529,454,508,578,474,511,489,20,-42,-20,-15,-31,22,-18,-110,2,-70,-45,2,30,12,28,25,19,14,12,-4,1,-1,28,141,78,298,68,129,165,274,36,265,199,30,171,90,326,93,148,179,286,32,266,198,-3,-2,-2,-4,-8,-4,0,0,-2,-3,1,966,966,926,942,961,966,1053,1036,1065,1059,1062,1062,11.376188723,12.158670652,12.706256066,12.498117753,11.913104415,12.213512133,11.616362192,11.784511785,10.887679147,10.914990904,12.442706416,12.665281929,13.084418449,13.276113035,11.362498749,12.662171762,14.346703733,11.734997029,12.615882186,12.021239982,-1.066517693,-0.506611277,-0.378162383,-0.777995282,0.5506056662,-0.448659629,-2.730341541,0.0495147554,-1.728203039,-1.106249078,0.761798352,0.3039667663,0.7059031148,0.6274155499,0.4755230754,0.3489574895,0.2978554408,-0.099029511,0.0246886148,-0.024583313,3.5804522543,1.975783981,7.5128260075,1.7065702956,3.2285514065,4.1127132691,6.8010325655,0.8912655971,6.542482934,4.8920792566,4.3422506063,2.2797507473,8.2187291223,2.3339858455,3.7040744819,4.4616707586,7.0988880064,0.7922360864,6.5671715488,4.8674959438 +050,4,8,16,071,Idaho,Oneida County,4286,4286,4290,4232,4224,4256,4177,4249,4302,4393,4429,4500,4520,4,-58,-8,32,-79,72,53,91,36,71,20,17,53,47,51,44,43,56,54,55,56,56,12,37,36,38,42,40,41,33,58,28,38,5,16,11,13,2,3,15,21,-3,28,18,0,6,11,6,5,4,0,-1,-1,-1,-1,-1,-81,-30,13,-90,65,38,72,40,45,4,-1,-75,-19,19,-85,69,38,71,39,44,3,0,1,0,0,4,0,0,-1,0,-1,-1,50,50,50,50,50,50,50,50,50,50,50,50,12.438394743,11.116367077,12.028301887,10.435195067,10.206503679,13.097883289,12.42093157,12.46882793,12.543397917,12.416851441,8.6834076508,8.5146641438,8.9622641509,9.9608680185,9.4944220271,9.5895216934,7.5905692927,13.148945817,6.2716989584,8.4257206208,3.7549870922,2.6017029328,3.0660377358,0.4743270485,0.712081652,3.5083615951,4.8303622772,-0.680117887,6.2716989584,3.9911308204,1.4081201596,2.6017029328,1.4150943396,1.1858176212,0.9494422027,0,-0.230017251,-0.226705962,-0.223989249,-0.22172949,-19.00962215,-7.095553453,3.0660377358,-21.34471718,15.428435794,8.8878493743,16.561242093,9.0682384947,10.079516183,0.8869179601,-17.60150199,-4.49385052,4.4811320755,-20.15889956,16.377877997,8.8878493743,16.331224842,8.8415325323,9.8555269347,0.6651884701 +050,4,8,16,073,Idaho,Owyhee County,11526,11526,11474,11378,11411,11396,11292,11294,11368,11632,11664,11823,12133,-52,-96,33,-15,-104,2,74,264,32,159,310,36,130,147,142,133,142,137,151,134,140,145,32,97,87,96,80,103,86,95,112,88,109,4,33,60,46,53,39,51,56,22,52,36,1,2,4,25,-2,8,8,-1,-5,-3,-2,-61,-130,-31,-87,-157,-43,16,210,14,109,280,-60,-128,-27,-62,-159,-35,24,209,9,106,278,4,-1,0,1,2,-2,-1,-1,1,1,-4,160,160,160,160,160,160,160,160,160,166,160,160,11.377559951,12.90096099,12.452317271,11.72425952,12.574160985,12.090724561,13.130434783,11.504120879,11.921488483,12.105526799,8.4894101173,7.6352626267,8.4184680142,7.0521861777,9.1206942354,7.5897978996,8.2608695652,9.6153846154,7.4935070465,9.1000166973,2.8881498337,5.2656983632,4.0338492568,4.6720733427,3.4534667493,4.5009266614,4.8695652174,1.8887362637,4.4279814365,3.0055101019,0.1750393839,0.3510465575,2.1923093787,-0.176304654,0.7084034358,0.7060277116,-0.086956522,-0.429258242,-0.255460467,-0.166972783,-11.37755995,-2.720610821,-7.629236638,-13.83991537,-3.807668467,1.4120554232,18.260869565,1.2019230769,9.2817303189,23.376189681,-11.20252057,-2.369564263,-5.436927259,-14.01622003,-3.099265031,2.1180831348,18.173913043,0.7726648352,9.0262698514,23.209216898 +050,4,8,16,075,Idaho,Payette County,22623,22622,22640,22561,22697,22581,22790,22833,22927,23218,23560,24051,24771,18,-79,136,-116,209,43,94,291,342,491,720,89,323,304,297,304,316,282,293,308,307,304,28,202,186,198,203,219,232,195,245,250,248,61,121,118,99,101,97,50,98,63,57,56,0,-7,-4,-12,-23,-20,-26,-27,-28,-28,-21,-44,-193,27,-205,136,-31,71,221,307,463,688,-44,-200,23,-217,113,-51,45,194,279,435,667,1,0,-5,2,-5,-3,-1,-1,0,-1,-3,94,94,94,94,103,101,101,101,100,124,149,149,14.29171921,13.434089001,13.118954017,13.400630359,13.852662035,12.325174825,12.699100661,13.168583522,12.896179454,12.453402155,8.9378553572,8.2195412966,8.7459693449,8.948447246,9.6004208404,10.13986014,8.4516198938,10.47500962,10.5017748,10.159354389,5.3538638526,5.2145477043,4.3729846725,4.4521831126,4.2522411941,2.1853146853,4.2474807671,2.6935739023,2.3944046544,2.2940477654,-0.309727661,-0.176764329,-0.530058748,-1.013863481,-0.876750762,-1.136363636,-1.170224293,-1.197143957,-1.176198778,-0.860267912,-8.539634079,1.1931592205,-9.055170281,5.9950188446,-1.358963681,3.1031468531,9.5785025463,13.125828381,19.449286929,28.184015403,-8.84936174,1.0163948915,-9.58522903,4.9811553636,-2.235714442,1.9667832168,8.4082782533,11.928684424,18.273088152,27.323747491 +050,4,8,16,077,Idaho,Power County,7817,7819,7873,7783,7833,7794,7734,7690,7653,7587,7654,7636,7643,54,-90,50,-39,-60,-44,-37,-66,67,-18,7,34,134,128,134,145,145,108,139,95,111,110,3,53,61,56,71,77,69,49,60,60,67,31,81,67,78,74,68,39,90,35,51,43,-2,6,36,37,15,6,-9,-14,-16,-15,-10,25,-178,-55,-158,-152,-119,-67,-143,48,-55,-26,23,-172,-19,-121,-137,-113,-76,-157,32,-70,-36,0,1,2,4,3,1,0,1,0,1,0,47,47,47,47,47,47,47,47,47,47,47,47,17.118037813,16.393442623,17.149804825,18.675940237,18.80186722,14.07808121,18.241469816,12.466373598,14.519293656,14.398848092,6.7705671947,7.8125,7.1670826134,9.1447707367,9.984439834,8.9943296617,6.4304461942,7.8734991142,7.8482668411,8.7702074743,10.347470618,8.580942623,9.9827222116,9.5311695003,8.8174273859,5.0837515479,11.811023622,4.5928744833,6.6710268149,5.6286406178,0.7664793051,4.6106557377,4.7353938696,1.9319938176,0.7780082988,-1.173173434,-1.837270341,-2.099599764,-1.96206671,-1.30898619,-22.73888605,-7.044057377,-20.22141166,-19.57753735,-15.43049793,-8.733624454,-18.7664042,6.2987992914,-7.194244604,-3.403364095,-21.97240675,-2.433401639,-15.48601779,-17.64554353,-14.65248963,-9.906797888,-20.60367454,4.1991995276,-9.156311315,-4.712350285 +050,4,8,16,079,Idaho,Shoshone County,12765,12800,12750,12664,12703,12675,12380,12446,12428,12511,12781,12868,12911,-50,-86,39,-28,-295,66,-18,83,270,87,43,34,125,111,126,141,147,167,145,149,139,141,53,187,192,194,176,158,197,212,171,170,189,-19,-62,-81,-68,-35,-11,-30,-67,-22,-31,-48,0,5,3,0,10,19,13,7,1,2,3,-31,-30,116,40,-278,60,0,142,292,115,89,-31,-25,119,40,-268,79,13,149,293,117,92,0,1,1,0,8,-2,-1,1,-1,1,-1,160,160,160,160,160,160,160,160,160,163,160,160,9.8370976627,8.7515275752,9.9298605091,11.255238475,11.842423266,13.427675484,11.628373231,11.782381781,10.838629186,10.939136506,14.716298103,15.137777427,15.288832847,14.049091998,12.728590993,15.839832757,17.00148362,13.522062312,13.255877422,14.66309787,-4.879200441,-6.386249852,-5.358972338,-2.793853522,-0.886167727,-2.412157273,-5.373110389,-1.739680531,-2.417248236,-3.723961364,0.3934839065,0.2365277723,0,0.7982438635,1.5306533473,1.0452681515,0.5613697422,0.0790763878,0.1559514991,0.2327475852,-2.360903439,9.145740529,3.1523366696,-22.19117941,4.8336421494,0,11.387786198,23.090305235,8.9672111973,6.9048450289,-1.967419533,9.3822683013,3.1523366696,-21.39293554,6.3642954967,1.0452681515,11.94915594,23.169381623,9.1231626964,7.1375926141 +050,4,8,16,081,Idaho,Teton County,10170,10165,10149,10161,10128,10410,10450,10744,11179,11463,11640,12096,12501,-16,12,-33,282,40,294,435,284,177,456,405,46,158,151,160,151,149,146,148,132,129,128,18,35,33,44,31,47,40,43,42,46,67,28,123,118,116,120,102,106,105,90,83,61,1,8,49,35,9,30,53,25,15,20,17,-47,-121,-206,128,-87,157,275,153,71,353,329,-46,-113,-157,163,-78,187,328,178,86,373,346,2,2,6,3,-2,5,1,1,1,0,-2,7,7,7,7,7,7,7,7,7,7,7,7,15.558838011,14.884913007,15.580874477,14.47746884,14.060583184,13.31934498,13.073050084,11.427087391,10.869565217,10.407773306,3.4465780404,3.2529942333,4.2847404811,2.9721955896,4.4352175144,3.649135611,3.7982510379,3.6358914427,3.8759689922,5.4478188397,12.11225997,11.631918774,11.296133996,11.50527325,9.6253656695,9.6702093692,9.274799046,7.7911959486,6.9935962251,4.959954466,0.7877892664,4.8302035586,3.4083162918,0.8628954938,2.8309899028,4.8351046846,2.2082854871,1.2985326581,1.6852039097,1.3822823922,-11.91531265,-20.30657006,12.464699581,-8.341323106,14.815513825,25.087807326,13.514707181,6.146387915,29.743849006,26.751229825,-11.12752339,-15.4763665,15.873015873,-7.478427613,17.646503727,29.92291201,15.722992668,7.4449205731,31.429052915,28.133512217 +050,4,8,16,083,Idaho,Twin Falls County,77230,77240,77547,78108,78564,79919,81019,82289,83847,85439,86166,87127,88411,307,561,456,1355,1100,1270,1558,1592,727,961,1284,339,1176,1197,1207,1209,1236,1171,1275,1165,1165,1155,143,715,666,733,720,765,780,746,760,801,850,196,461,531,474,489,471,391,529,405,364,305,37,230,212,245,155,276,367,195,60,77,70,80,-127,-281,638,462,531,801,870,264,520,908,117,103,-69,883,617,807,1168,1065,324,597,978,-6,-3,-6,-2,-6,-8,-1,-2,-2,0,1,1072,1072,1038,1003,999,993,982,996,964,962,962,962,15.110340175,15.280330882,15.231917619,15.024419342,15.137041664,14.09688448,15.063265716,13.577692958,13.445436342,13.159543802,9.1869840352,8.5018382353,9.2502034919,8.9475450173,9.3688000588,9.3898974334,8.8134872346,8.8575507707,9.2444588068,9.6845127551,5.9233561402,6.7784926471,5.9817141271,6.0768743243,5.7682416048,4.7069870468,6.2497784814,4.720142187,4.2009775352,3.4750310474,2.9552536057,2.7062908497,3.091814264,1.9262076079,3.3801160996,4.4180671257,2.3037935801,0.699280324,0.8886683247,0.7975481092,-1.631813948,-3.587111928,8.0513367364,5.7413413861,6.5030494526,9.6427023643,10.278463665,3.0768334256,6.0013964788,10.345338331,1.3234396582,-0.880821078,11.143151,7.667548994,9.8831655522,14.06076949,12.582257245,3.7761137496,6.8900648035,11.142886441 +050,4,8,16,085,Idaho,Valley County,9862,9854,9788,9639,9544,9585,9805,10058,10438,10700,11054,11443,11792,-66,-149,-95,41,220,253,380,262,354,389,349,19,89,81,92,95,82,83,100,101,94,96,6,70,58,61,59,91,70,93,73,66,94,13,19,23,31,36,-9,13,7,28,28,2,0,-3,-2,-7,-5,-5,-1,-4,-5,-5,-4,-85,-165,-116,18,181,264,365,260,329,367,354,-85,-168,-118,11,176,259,364,256,324,362,350,6,0,0,-1,8,3,3,-1,2,-1,-3,66,66,66,66,66,66,66,66,66,66,66,66,9.1625057909,8.4449773237,9.6189032359,9.7988653945,8.2565574183,8.0991412959,9.4616330779,9.2856486163,8.3566697782,8.2633957392,7.2064652288,6.0470207997,6.3777510586,6.0856111398,9.1627649398,6.8306010929,8.7993187624,6.711409396,5.8674489932,8.0912416613,1.9560405621,2.397956524,3.2411521773,3.7132542548,-0.906207522,1.268540203,0.6623143155,2.5742392204,2.489220785,0.1721540779,-0.30884851,-0.208517959,-0.731873072,-0.515729758,-0.503448623,-0.097580016,-0.378465323,-0.459685575,-0.444503712,-0.344308156,-16.98666804,-12.0940416,1.8819593288,18.669417225,26.582087298,35.616705699,24.600246002,30.247310839,32.626572432,30.471271788,-17.29551655,-12.30255956,1.1500862565,18.153687468,26.078638675,35.519125683,24.221780679,29.787625264,32.18206872,30.126963632 +050,4,8,16,087,Idaho,Washington County,10198,10198,10177,10135,10028,9916,9956,9894,10030,10055,10070,10126,10360,-21,-42,-107,-112,40,-62,136,25,15,56,234,26,111,92,108,119,104,106,121,94,100,92,46,112,122,123,135,104,115,113,137,113,110,-20,-1,-30,-15,-16,0,-9,8,-43,-13,-18,0,-5,-4,-5,-5,-6,-8,-11,-11,-11,-8,1,-36,-74,-93,63,-55,153,29,68,81,262,1,-41,-78,-98,58,-61,145,18,57,70,254,-2,0,1,1,-2,-1,0,-1,1,-1,-2,119,119,119,119,119,119,119,119,119,119,119,119,10.929499803,9.1256261469,10.83032491,11.976650564,10.478589421,10.640433648,12.048792631,9.3416149068,9.9029510794,8.9817436298,11.027963765,12.101373804,12.334536703,13.586956522,10.478589421,11.543866693,11.252178242,13.614906832,11.19033472,10.739041296,-0.098463962,-2.975747657,-1.504211793,-1.610305958,0,-0.903433046,0.7966143888,-4.273291925,-1.28738364,-1.757297667,-0.492319811,-0.396766354,-0.501403931,-0.503220612,-0.604534005,-0.803051596,-1.095344785,-1.093167702,-1.089324619,-0.781021185,-3.544702639,-7.340177553,-9.326113117,6.3405797101,-5.541561713,15.358361775,2.8877271596,6.7577639752,8.0213903743,25.578443815,-4.03702245,-7.736943907,-9.827517048,5.8373590982,-6.146095718,14.555310179,1.7923823749,5.6645962733,6.9320657556,24.79742263 +040,2,3,17,000,Illinois,Illinois,12830632,12831572,12840545,12867783,12883029,12895778,12885092,12859585,12821709,12779893,12724685,12667017,12587530,8973,27238,15246,12749,-10686,-25507,-37876,-41816,-55208,-57668,-79487,41839,162419,160154,157503,157501,159256,156747,151354,148028,142527,140833,24075,101615,101312,104308,102684,107563,106154,108768,110595,109472,118232,17764,60804,58842,53195,54817,51693,50593,42586,37433,33055,22601,4946,30893,27408,27738,28923,30358,24566,30046,20899,13235,11164,-13373,-64513,-70921,-68005,-94884,-107883,-113193,-114690,-113775,-104056,-113205,-8427,-33620,-43513,-40267,-65961,-77525,-88627,-84644,-92876,-90821,-102041,-364,54,-83,-179,458,325,158,242,235,98,-47,302246,302247,301716,300922,301127,300267,299326,296544,296753,296930,296923,296880,12.635516398,12.438753388,12.219572457,12.218439486,12.37195557,12.207095172,11.823791339,11.607955246,11.226265967,11.153080671,7.9052204406,7.8686450742,8.0925389604,7.9659065035,8.3561351343,8.2670289122,8.4969682757,8.6725606673,8.6226594814,9.363224769,4.730295957,4.5701083135,4.1270334969,4.2525329828,4.0158204354,3.9400662599,3.3268230637,2.935394579,2.6036064853,1.789855902,2.4033457174,2.1287095723,2.1520002846,2.243756708,2.3583904354,1.9131434732,2.3471968668,1.6388430344,1.0424665507,0.8841180165,-5.018840587,-5.508253487,-5.276039345,-7.360806676,-8.380994642,-8.815210012,-8.959595575,-8.921927663,-8.196063423,-8.965118242,-2.61549487,-3.379543915,-3.12403906,-5.117049968,-6.022604207,-6.902066539,-6.612398708,-7.283084629,-7.153596872,-8.081000225 +050,2,3,17,001,Illinois,Adams County,67103,67095,67158,67214,67149,67005,66983,66850,66490,66073,65603,65402,64783,63,56,-65,-144,-22,-133,-360,-417,-470,-201,-619,201,811,806,805,851,828,843,839,791,753,737,153,770,799,784,758,826,809,789,879,821,900,48,41,7,21,93,2,34,50,-88,-68,-163,5,21,19,31,49,30,23,25,17,13,17,19,-4,-85,-192,-160,-161,-415,-491,-398,-146,-472,24,17,-66,-161,-111,-131,-392,-466,-381,-133,-455,-9,-2,-6,-4,-4,-4,-2,-1,-1,0,-1,2287,2287,2333,2255,2220,2177,2051,2019,2019,2017,2017,2018,12.070967166,11.997350461,12.001133026,12.702630086,12.373629822,12.644367782,12.65813236,12.014338224,11.495744437,11.322348965,11.460720984,11.89315511,11.688059991,11.31444607,12.343741828,12.13439328,11.903774055,13.350952338,12.533872753,13.826477705,0.6102461822,0.1041953514,0.3130730355,1.3881840165,0.0298879947,0.5099745013,0.7543583051,-1.336614113,-1.038128316,-2.50412874,0.3125651177,0.2828159538,0.4621554333,0.7314087829,0.4483199211,0.3449827509,0.3771791526,0.2582095446,0.1984657074,0.2611668011,-0.059536213,-1.265229267,-2.862382039,-2.388273577,-2.405983577,-6.224688766,-7.407798556,-6.045141104,-2.22892256,-7.251219419,0.2530289048,-0.982413313,-2.400226605,-1.656864794,-1.957663655,-5.879706015,-7.030619404,-5.786931559,-2.030456853,-6.990052617 +050,2,3,17,003,Illinois,Alexander County,8238,8238,8205,7993,7721,7242,7084,6763,6448,6276,6043,5791,5497,-33,-212,-272,-479,-158,-321,-315,-172,-233,-252,-294,29,106,102,97,110,99,69,92,53,52,43,38,111,82,97,116,103,101,97,92,63,84,-9,-5,20,0,-6,-4,-32,-5,-39,-11,-41,1,2,1,2,0,0,-1,-1,-1,-1,0,-26,-209,-304,-501,-154,-321,-284,-166,-192,-239,-251,-25,-207,-303,-499,-154,-321,-285,-167,-193,-240,-251,1,0,11,20,2,4,2,0,-1,-1,-2,543,543,543,510,132,132,132,132,132,132,132,132,13.08803556,12.982054219,12.965314442,15.356694123,14.299126165,10.445840587,14.460861364,8.6045945288,8.7882372824,7.6187101347,13.705395728,10.436553392,12.965314442,16.194331984,14.876868636,15.290288396,15.246777743,14.936277295,10.647287477,14.883061658,-0.617360168,2.5455008273,0,-0.837637861,-0.577742471,-4.844447809,-0.785916378,-6.331682766,-1.859050194,-7.264351524,0.2469440672,0.1272750414,0.267326071,0,0,-0.151388994,-0.157183276,-0.16235084,-0.169004563,0,-25.80565502,-38.69161257,-66.96518078,-21.49937177,-46.36383332,-42.9944743,-26.09242377,-31.17136131,-40.39209059,-44.47200567,-25.55871095,-38.56433753,-66.69785471,-21.49937177,-46.36383332,-43.1458633,-26.24960704,-31.33371215,-40.56109515,-44.47200567 +050,2,3,17,005,Illinois,Bond County,17768,17770,17789,17727,17538,17332,17076,16688,16553,16654,16668,16458,16262,19,-62,-189,-206,-256,-388,-135,101,14,-210,-196,43,175,174,163,146,163,147,140,152,148,147,33,169,168,169,160,187,185,162,176,170,177,10,6,6,-6,-14,-24,-38,-22,-24,-22,-30,3,20,10,10,9,9,8,10,7,7,5,9,-89,-210,-215,-257,-378,-106,113,33,-196,-171,12,-69,-200,-205,-248,-369,-98,123,40,-189,-166,-3,1,5,5,6,5,1,0,-2,1,0,2060,2060,2003,1947,1891,1834,1645,1602,1600,1602,1602,1602,9.8547133686,9.8681412165,9.3490106108,8.486398512,9.6552541168,8.844499263,8.4319571175,9.1231018546,8.9355793033,8.9853300733,9.5168374817,9.5278604849,9.6931459707,9.3001627528,11.076886625,11.130832406,9.7569789502,10.563591621,10.263841092,10.819070905,0.3378758869,0.3402807316,-0.34413536,-0.813764241,-1.421632508,-2.286333143,-1.325021833,-1.440489767,-1.328261788,-1.833740831,1.1262529564,0.5671345527,0.5735589332,0.5231341548,0.5331121905,0.4813332932,0.6022826512,0.4201428486,0.4226287508,0.3056234719,-5.011825656,-11.90982561,-12.33151706,-14.93838642,-22.390712,-6.377666135,6.8057939591,1.980673429,-11.83360502,-10.45232274,-3.8855727,-11.34269105,-11.75795813,-14.41525227,-21.85759981,-5.896332842,7.4080766104,2.4008162775,-11.41097627,-10.14669927 +050,2,3,17,007,Illinois,Boone County,54165,54161,54094,54123,53729,53737,53702,53571,53559,53481,53368,53281,52777,-67,29,-394,8,-35,-131,-12,-78,-113,-87,-504,146,610,614,526,585,606,579,599,557,505,501,115,344,366,401,396,398,399,427,461,431,414,31,266,248,125,189,208,180,172,96,74,87,-7,-30,-57,-33,-3,19,-2,4,-14,-13,-9,-91,-207,-603,-83,-223,-361,-189,-257,-194,-147,-580,-98,-237,-660,-116,-226,-342,-191,-253,-208,-160,-589,0,0,18,-1,2,3,-1,3,-1,-1,-2,310,310,310,310,310,310,310,310,310,310,310,310,11.273644621,11.385973371,9.7891426125,10.889900316,11.29827636,10.809297116,11.192077728,10.425928179,9.4703185215,9.4476607139,6.3575963111,6.7870785892,7.4628254518,7.371624829,7.4203201178,7.4488938673,7.9783258595,8.6289998035,8.0825886787,7.8070489732,4.9160483103,4.5988947817,2.3263171608,3.5182754866,3.8779562425,3.3604032484,3.2137518685,1.7969283756,1.3877298428,1.6406117407,-0.554441539,-1.057004043,-0.61414773,-0.055845643,0.3542363875,-0.037337814,0.0747384155,-0.262052055,-0.243790378,-0.169718456,-3.825646617,-11.18199013,-1.544674595,-4.15119277,-6.730491363,-3.528423411,-4.801943199,-3.631292759,-2.75670658,-10.9374116,-4.380088156,-12.23899418,-2.158822325,-4.207038412,-6.376254976,-3.565761225,-4.727204783,-3.893344814,-3.000496957,-11.10713006 +050,2,3,17,009,Illinois,Brown County,6937,6937,6919,6883,6893,6867,6836,6755,6636,6614,6580,6619,6546,-18,-36,10,-26,-31,-81,-119,-22,-34,39,-73,10,43,64,51,55,55,59,66,59,63,64,9,56,48,45,68,49,42,76,61,53,61,1,-13,16,6,-13,6,17,-10,-2,10,3,0,2,4,3,-1,5,6,9,8,3,5,-19,-26,-10,-34,-15,-95,-143,-22,-39,24,-80,-19,-24,-6,-31,-16,-90,-137,-13,-31,27,-75,0,1,0,-1,-2,3,1,1,-1,2,-1,2110,2110,2110,2094,2109,2109,2057,1982,1983,1986,1985,1985,6.2309810172,9.2915214866,7.4127906977,8.0274392469,8.0935913472,8.8118885819,9.9622641509,8.9434591481,9.5461777407,9.7227497152,8.1147659759,6.968641115,6.5406976744,9.924833978,7.2106541093,6.272869838,11.471698113,9.2466272548,8.0309114327,9.2669958223,-1.883784959,2.3228803717,0.8720930233,-1.897394731,0.8829372379,2.5390187439,-1.509433962,-0.303168107,1.5152663081,0.4557538929,0.2898130706,0.5807200929,0.4360465116,-0.145953441,0.7357810316,0.8961242626,1.358490566,1.2126724269,0.4545798924,0.7595898215,-3.767569917,-1.451800232,-4.941860465,-2.189301613,-13.9798396,-21.35762826,-3.320754717,-5.911778081,3.6366391393,-12.15343714,-3.477756847,-0.871080139,-4.505813953,-2.335255054,-13.24405857,-20.461504,-1.962264151,-4.699105654,4.0912190317,-11.39384732 +050,2,3,17,011,Illinois,Bureau County,34978,34980,34959,34631,34350,34112,33858,33494,33393,33134,32938,32621,32303,-21,-328,-281,-238,-254,-364,-101,-259,-196,-317,-318,95,330,330,355,327,365,354,341,334,295,298,64,394,375,381,385,385,408,426,399,359,406,31,-64,-45,-26,-58,-20,-54,-85,-65,-64,-108,2,16,15,16,20,24,15,17,12,11,10,-55,-280,-256,-229,-217,-371,-60,-191,-143,-265,-220,-53,-264,-241,-213,-197,-347,-45,-174,-131,-254,-210,1,0,5,1,1,3,-2,0,0,1,0,456,456,456,456,456,456,456,456,457,457,457,457,9.4841212818,9.5678520172,10.370716602,9.6218920112,10.838579404,10.58501652,10.251476844,10.110182831,8.9995271435,9.1799642659,11.323466015,10.87255911,11.130262043,11.328527291,11.432474166,12.199680057,12.806830309,12.077733382,10.951966931,12.506931181,-1.839344733,-1.304707093,-0.759545441,-1.70663528,-0.593894762,-1.614663537,-2.555353466,-1.967550551,-1.952439787,-3.326966915,0.4598361834,0.4349023644,0.4674125792,0.5884949242,0.7126737142,0.4485176492,0.5110706931,0.3632401017,0.3355755884,0.3080524921,-8.047133209,-7.422333686,-6.68984254,-6.385169928,-11.01674783,-1.794070597,-5.742029552,-4.328611212,-8.084320993,-6.777154827,-7.587297025,-6.987431322,-6.222429961,-5.796675004,-10.30407412,-1.345552948,-5.230958859,-3.96537111,-7.748745405,-6.469102335 +050,2,3,17,013,Illinois,Calhoun County,5089,5087,5093,5047,4983,5006,4923,4858,4872,4847,4834,4740,4616,6,-46,-64,23,-83,-65,14,-25,-13,-94,-124,11,59,51,39,56,49,52,41,43,35,36,4,50,59,53,51,53,45,58,41,64,68,7,9,-8,-14,5,-4,7,-17,2,-29,-32,0,2,2,3,0,1,1,1,1,0,0,-1,-58,-59,34,-91,-63,7,-8,-16,-64,-92,-1,-56,-57,37,-91,-62,8,-7,-15,-64,-92,0,1,1,0,3,1,-1,-1,0,-1,0,90,90,90,90,90,90,90,90,90,90,90,90,11.637080868,10.169491525,7.8085894484,11.280088629,10.019425417,10.688591984,8.4370820043,8.8833798161,7.3114685607,7.6955964087,9.8619329389,11.764705882,10.61167284,10.272937859,10.837337696,9.2497430627,11.935384299,8.4701993596,13.369542511,14.53612655,1.775147929,-1.595214357,-2.803083392,1.0071507705,-0.817912279,1.4388489209,-3.498302294,0.4131804566,-6.05807395,-6.840530141,0.3944773176,0.3988035892,0.6006607268,0,0.2044780697,0.2055498458,0.2057824879,0.2065902283,0,0,-11.43984221,-11.76470588,6.8074882371,-18.33014402,-12.88211839,1.4388489209,-1.646259903,-3.305443653,-13.36954251,-19.66652416,-11.04536489,-11.36590229,7.4081489639,-18.33014402,-12.67764032,1.6443987667,-1.440477415,-3.098853424,-13.36954251,-19.66652416 +050,2,3,17,015,Illinois,Carroll County,15387,15394,15395,15229,15121,14969,14783,14638,14601,14473,14337,14338,14241,1,-166,-108,-152,-186,-145,-37,-128,-136,1,-97,51,137,146,135,132,161,152,117,152,118,129,39,181,193,194,191,190,179,181,196,184,201,12,-44,-47,-59,-59,-29,-27,-64,-44,-66,-72,0,8,8,3,0,3,2,3,2,0,2,-11,-129,-68,-94,-128,-118,-11,-67,-94,69,-26,-11,-121,-60,-91,-128,-115,-9,-64,-92,69,-24,0,-1,-1,-2,1,-1,-1,0,0,-2,-1,223,223,223,223,223,223,223,223,223,224,223,223,8.94723093,9.6210873147,8.9730807577,8.8733530519,10.944563407,10.397072403,8.0484281489,10.551891704,8.2301656495,9.027607684,11.820794148,12.718286656,12.894649385,12.839472977,12.915944393,12.243920791,12.450987136,13.606386671,12.83347864,14.066272438,-2.873563218,-3.097199341,-3.921568627,-3.966119925,-1.971380986,-1.846848387,-4.402558987,-3.054494967,-4.60331299,-5.038664754,0.5224660397,0.5271828666,0.1994017946,0,0.2039359641,0.1368035843,0.2063699525,0.1388406803,0,0.1399629098,-8.42476489,-4.481054366,-6.247922898,-8.604463565,-8.021481255,-0.752419713,-4.60892894,-6.525511975,4.81255449,-1.819517828,-7.902298851,-3.953871499,-6.048521103,-8.604463565,-7.817545291,-0.615616129,-4.402558987,-6.386671295,4.81255449,-1.679554918 +050,2,3,17,017,Illinois,Cass County,13642,13641,13632,13625,13427,13293,13079,12843,12677,12525,12353,12141,11925,-9,-7,-198,-134,-214,-236,-166,-152,-172,-212,-216,43,179,188,161,154,185,167,183,173,172,159,36,139,153,134,142,160,159,143,137,148,145,7,40,35,27,12,25,8,40,36,24,14,7,33,42,39,45,44,62,74,80,38,35,-23,-80,-284,-204,-277,-309,-237,-268,-287,-274,-263,-16,-47,-242,-165,-232,-265,-175,-194,-207,-236,-228,0,0,9,4,6,4,1,2,-1,0,-2,184,184,184,184,184,184,184,184,184,184,184,184,13.134240745,13.899157179,12.050898204,11.679053542,14.273590001,13.087774295,14.522656932,13.907870408,14.044255736,13.213662428,10.199214881,11.31154813,10.02994012,10.768997422,12.344726487,12.460815047,11.34830569,11.013747086,12.084592145,12.050195296,2.9350258649,2.5876090492,2.0209580838,0.9100561201,1.9288635136,0.6269592476,3.174351242,2.8941233218,1.9596635911,1.1634671321,2.4213963386,3.1051308591,2.9191616766,3.4127104505,3.394799784,4.8589341693,5.8725497976,6.4313851596,3.1028006859,2.9086678301,-5.87005173,-20.99659914,-15.26946108,-21.00712877,-23.84075303,-18.57366771,-21.26815332,-23.07259426,-22.372826,-21.85656112,-3.448655391,-17.89146828,-12.3502994,-17.59441832,-20.44595324,-13.71473354,-15.39560352,-16.6412091,-19.27002531,-18.94789329 +050,2,3,17,019,Illinois,Champaign County,201081,201087,201558,203239,204697,206527,208068,209534,210388,210630,210206,209612,209192,471,1681,1458,1830,1541,1466,854,242,-424,-594,-420,603,2337,2422,2350,2447,2429,2405,2347,2280,2212,2200,282,1243,1146,1262,1236,1278,1313,1378,1336,1404,1528,321,1094,1276,1088,1211,1151,1092,969,944,808,672,387,2097,1839,1965,1882,2089,1837,2155,1683,1299,1030,-234,-1521,-1680,-1233,-1559,-1784,-2084,-2911,-3071,-2709,-2126,153,576,159,732,323,305,-247,-756,-1388,-1410,-1096,-3,11,23,10,7,10,9,29,20,8,4,16129,16125,16121,16212,16239,16301,16346,16403,16397,16391,16381,16384,11.54652826,11.874411672,11.42929401,11.804290935,11.633086048,11.454508218,11.149167019,10.835574903,10.537899757,10.506107869,6.1413498618,5.6185283966,6.1377740599,5.9624452779,6.1206603417,6.2535423245,6.5460384117,6.3492666977,6.6886126845,7.2969694654,5.4051783981,6.2558832758,5.2915199502,5.8418456566,5.5124257068,5.2009658937,4.6031286073,4.4863082056,3.849287072,3.2091384036,10.360748721,9.0161201757,9.5568352042,9.0787394928,10.004741357,8.7492439072,10.237092001,7.9983651589,6.1883959239,4.9187686842,-7.514877828,-8.236586131,-5.996731708,-7.520592385,-8.544020383,-9.925652859,-13.82838738,-14.594759,-12.90559242,-10.1527206,2.8458708933,0.7795340446,3.5601034959,1.5581471074,1.4607209736,-1.176408952,-3.591295384,-6.596393845,-6.717196499,-5.23395192 +050,2,3,17,021,Illinois,Christian County,34800,34797,34767,34705,34522,34155,33824,33480,33268,33045,32709,32427,32075,-30,-62,-183,-367,-331,-344,-212,-223,-336,-282,-352,92,350,379,362,324,341,360,332,323,349,340,111,416,414,415,396,421,429,425,423,383,395,-19,-66,-35,-53,-72,-80,-69,-93,-100,-34,-55,3,19,13,3,2,5,13,12,8,6,3,-10,-14,-162,-319,-264,-270,-153,-142,-244,-254,-298,-7,5,-149,-316,-262,-265,-140,-130,-236,-248,-295,-4,-1,1,2,3,1,-3,0,0,0,-2,1610,1610,1610,1610,1610,1610,1602,1596,1595,1595,1596,1596,10.076001842,10.949485028,10.542102887,9.5323555804,10.133127303,10.786840055,10.013119599,9.824497369,10.716040285,10.542308766,11.976047904,11.960651191,12.08555994,11.65065682,12.510400571,12.854317732,12.817999487,12.866137421,11.760009826,12.247682242,-1.900046062,-1.011166163,-1.543457053,-2.11830124,-2.377273268,-2.067477677,-2.804879888,-3.041640052,-1.043969541,-1.705373477,0.5469829572,0.3755760036,0.0873654935,0.0588417011,0.1485795792,0.3895247798,0.3619199855,0.2433312042,0.1842299189,0.0930203715,-0.403040074,-4.680254814,-9.289864147,-7.767104547,-8.023297278,-4.584407023,-4.282719829,-7.421601728,-7.799066568,-9.240023565,0.1439428835,-4.30467881,-9.202498653,-7.708262846,-7.874717699,-4.194882244,-3.920799843,-7.178270523,-7.614836649,-9.147003194 +050,2,3,17,023,Illinois,Clark County,16335,16335,16291,16205,16265,16105,16060,15881,15860,15824,15594,15465,15268,-44,-86,60,-160,-45,-179,-21,-36,-230,-129,-197,53,200,201,182,203,177,174,190,170,187,185,69,207,199,207,210,199,204,176,198,202,214,-16,-7,2,-25,-7,-22,-30,14,-28,-15,-29,0,1,-2,1,3,-1,-3,-2,-2,-3,0,-27,-80,63,-137,-40,-156,14,-48,-200,-110,-167,-27,-79,61,-136,-37,-157,11,-50,-202,-113,-167,-1,0,-3,1,-1,0,-2,0,0,-1,-1,221,221,221,221,221,221,221,221,221,221,221,221,12.309207287,12.38065907,11.24497992,12.622415669,11.08293416,10.963737752,11.993435172,10.821821886,12.041598248,12.03917613,12.740029542,12.257468432,12.789620019,13.057671382,12.460473999,12.854037365,11.10970837,12.604239608,13.007501851,13.926398334,-0.430822255,0.1231906375,-1.544640099,-0.435255713,-1.377539839,-1.890299612,0.8837268022,-1.782417722,-0.965903603,-1.887222204,0.0615460364,-0.123190638,0.061785604,0.1865381626,-0.062615447,-0.189029961,-0.126246686,-0.127315552,-0.193180721,0,-4.923682915,3.8805050816,-8.464627742,-2.487175501,-9.768009768,0.8821398192,-3.029920465,-12.73155516,-7.083293087,-10.86779683,-4.862136878,3.7573144441,-8.402842138,-2.300637339,-9.830625215,0.6931098579,-3.156167151,-12.85887071,-7.276473808,-10.86779683 +050,2,3,17,025,Illinois,Clay County,13815,13812,13822,13721,13710,13550,13441,13395,13309,13259,13260,13177,13079,10,-101,-11,-160,-109,-46,-86,-50,1,-83,-98,40,145,177,167,143,163,163,150,169,135,153,30,182,150,195,157,164,187,177,178,164,192,10,-37,27,-28,-14,-1,-24,-27,-9,-29,-39,3,17,1,-2,-1,0,0,0,0,-1,-1,-1,-80,-40,-131,-93,-45,-60,-24,11,-52,-59,2,-63,-39,-133,-94,-45,-60,-24,11,-53,-60,-2,-1,1,1,-1,0,-2,1,-1,-1,1,305,305,305,305,305,305,305,305,305,305,305,305,10.528991032,12.90510736,12.252384446,10.596124634,12.147861082,12.207908928,11.291779584,12.745578642,10.21295911,11.654478976,13.215699089,10.936531661,14.306676449,11.633507465,12.222387837,14.005392451,13.32429991,13.424337268,12.40685403,14.625228519,-2.686708056,1.968575699,-2.054292003,-1.037382831,-0.074526755,-1.797483523,-2.032520325,-0.678758626,-2.19389492,-2.970749543,1.2344334314,0.0729102111,-0.146735143,-0.074098774,0,0,0,0,-0.075651549,-0.076173065,-5.809098501,-2.916408443,-9.611151871,-6.891185951,-3.35370398,-4.493708808,-1.806684734,0.8295938761,-3.933880546,-4.494210847,-4.574665069,-2.843498232,-9.757887014,-6.965284725,-3.35370398,-4.493708808,-1.806684734,0.8295938761,-4.009532095,-4.570383912 +050,2,3,17,027,Illinois,Clinton County,37762,37752,37833,38024,37908,37725,37637,37657,37594,37649,37666,37440,37398,81,191,-116,-183,-88,20,-63,55,17,-226,-42,102,400,431,413,392,452,430,419,409,402,388,59,292,337,349,333,388,328,358,366,390,422,43,108,94,64,59,64,102,61,43,12,-34,1,4,-1,1,6,5,5,13,5,3,5,40,81,-209,-249,-151,-47,-169,-17,-30,-241,-15,41,85,-210,-248,-145,-42,-164,-4,-25,-238,-10,-3,-2,0,1,-2,-2,-1,-2,-1,0,2,2072,2072,2072,2072,2075,2072,2069,2069,2069,2069,2070,2071,10.546159221,11.352262551,10.921158753,10.403120936,12.00626876,11.428419556,11.137248648,10.861050256,10.70487045,10.369063845,7.6986962311,8.8763630617,9.2287757989,8.8373450811,10.306266104,8.7174921264,9.5158353601,9.7191794463,10.385322078,11.277693151,2.8474629896,2.475899489,1.6923829545,1.5657758552,1.7000026563,2.7109274295,1.6214132876,1.1418708093,0.3195483716,-0.908629306,0.1054615922,-0.026339356,0.0264434837,0.1592314429,0.1328127075,0.1328885995,0.3455470941,0.1327756755,0.0798870929,0.1336219568,2.1355972422,-5.50492546,-6.584427432,-4.007324646,-1.248439451,-4.491634663,-0.451869277,-0.796654053,-6.417596464,-0.40086587,2.2410588344,-5.531264816,-6.557983949,-3.848093203,-1.115626743,-4.358746063,-0.106322183,-0.663878377,-6.337709371,-0.267243914 +050,2,3,17,029,Illinois,Coles County,53873,53876,53865,53632,53333,53075,52552,52217,51820,51403,50946,50774,50383,-11,-233,-299,-258,-523,-335,-397,-417,-457,-172,-391,113,504,509,500,492,530,521,515,488,459,461,147,512,486,525,482,539,524,485,506,493,518,-34,-8,23,-25,10,-9,-3,30,-18,-34,-57,7,36,34,62,82,104,66,78,58,43,30,22,-263,-358,-299,-630,-434,-463,-529,-499,-183,-364,29,-227,-324,-237,-548,-330,-397,-451,-441,-140,-334,-6,2,2,4,15,4,3,4,2,2,0,4489,4489,4381,4231,3942,3714,3484,3291,3294,3295,3296,3296,9.3770058699,9.5171317721,9.3977896399,9.3157999375,10.117496588,10.015667503,9.9783962876,9.5359993747,9.0247738891,9.1145447176,9.5258472329,9.0870845604,9.8676791219,9.1264544103,10.289303134,10.073339293,9.3971304845,9.8877370565,9.6932756587,10.241505778,-0.148841363,0.4300472117,-0.469889482,0.1893455272,-0.171806546,-0.05767179,0.5812658032,-0.351737682,-0.66850177,-1.126961061,0.6697861336,0.6357219651,1.1653259153,1.5526333229,1.9853200851,1.2687793766,1.5112910882,1.1333769749,0.8454581203,0.5931374003,-4.893159809,-6.693778339,-5.619878205,-11.92876821,-8.284893432,-8.900679566,-10.24965366,-9.75095018,-3.598112466,-7.19673379,-4.223373676,-6.058056374,-4.454552289,-10.37613489,-6.299573347,-7.631900189,-8.738362574,-8.617573205,-2.752654345,-6.60359639 +050,2,3,17,031,Illinois,Cook County,5194675,5195024,5198977,5219636,5239105,5252513,5254108,5243371,5223386,5199582,5171007,5145326,5108284,3953,20659,19469,13408,1595,-10737,-19985,-23804,-28575,-25681,-37042,18572,71847,70561,69283,69243,69505,67930,65460,63529,60725,60224,9365,39052,38870,39867,39030,40751,40294,41281,41234,42167,46387,9207,32795,31691,29416,30213,28754,27636,24179,22295,18558,13837,2792,18949,15627,16511,16989,17539,14309,17706,12369,7659,6356,-7928,-31108,-27382,-32194,-45650,-57268,-62033,-65793,-63312,-51875,-57179,-5136,-12159,-11755,-15683,-28661,-39729,-47724,-48087,-50943,-44216,-50823,-118,23,-467,-325,43,238,103,104,73,-23,-56,90629,90604,90699,90850,90945,90923,90875,90999,90995,90992,90962,90933,13.792046984,13.493211085,13.207305108,13.180831401,13.242227015,12.980142751,12.560721668,12.251763135,11.772594002,11.746887194,7.4965832784,7.4330170333,7.5997810824,7.4296008203,7.7639593278,7.6994239954,7.9211602684,7.9521037812,8.1748039735,9.0479353125,6.2954637052,6.060194052,5.6075240254,5.7512305812,5.4782676869,5.2807187556,4.6395613994,4.299659354,3.5977900287,2.6989518813,3.6375283351,2.9883137942,3.1474649573,3.2339607567,3.3415641984,2.7341802241,3.3974967591,2.3853997107,1.4848299294,1.2397584851,-5.971620215,-5.236194299,-6.137089627,-8.689758582,-10.91081011,-11.85333719,-12.62461901,-12.20991402,-10.05686808,-11.15295003,-2.33409188,-2.247880505,-2.98962467,-5.455797825,-7.569245911,-9.119156965,-9.227122255,-9.824514307,-8.572038146,-9.913191549 +050,2,3,17,033,Illinois,Crawford County,19817,19818,19801,19779,19594,19441,19290,19262,19139,18979,18849,18686,18512,-17,-22,-185,-153,-151,-28,-123,-160,-130,-163,-174,53,216,209,211,200,218,216,218,197,199,190,74,234,196,245,227,256,237,229,225,232,247,-21,-18,13,-34,-27,-38,-21,-11,-28,-33,-57,1,11,8,5,4,-2,-1,-1,-1,-1,-1,6,-16,-210,-123,-127,13,-101,-148,-101,-129,-117,7,-5,-202,-118,-123,11,-102,-149,-102,-130,-118,-3,1,4,-1,-1,-1,0,0,0,0,1,1495,1495,1495,1495,1495,1495,1495,1493,1493,1493,1493,1493,10.914603335,10.616412262,10.810810811,10.327644522,11.309400291,11.249707039,11.438165696,10.41556519,10.603436792,10.215602989,11.824153613,9.9560612603,12.552837197,11.721876533,13.280763644,12.343428557,12.015320846,11.89595009,12.361795657,13.280283886,-0.909550278,0.660351002,-1.742026387,-1.394232011,-1.971363353,-1.093721518,-0.57715515,-1.4803849,-1.758358865,-3.064680897,0.5558362809,0.4063698474,0.256180351,0.2065528904,-0.103755966,-0.052081977,-0.05246865,-0.052870889,-0.053283602,-0.053766332,-0.808489136,-10.66720849,-6.302036634,-6.558054272,0.6744137788,-5.26027968,-7.765360197,-5.339959818,-6.873584654,-6.290660788,-0.252652855,-10.26083865,-6.045856283,-6.351501381,0.5706578128,-5.312361657,-7.817828847,-5.392830707,-6.926868256,-6.34442712 +050,2,3,17,035,Illinois,Cumberland County,11048,11045,11053,11084,10955,10911,10931,10869,10884,10887,10782,10733,10649,8,31,-129,-44,20,-62,15,3,-105,-49,-84,31,121,117,126,133,115,131,136,110,120,105,19,125,111,120,96,123,109,114,131,109,121,12,-4,6,6,37,-8,22,22,-21,11,-16,4,16,16,9,2,2,1,0,0,0,0,-5,20,-155,-59,-18,-55,-6,-18,-85,-61,-68,-1,36,-139,-50,-16,-53,-5,-18,-85,-61,-68,-3,-1,4,0,-1,-1,-2,-1,1,1,0,117,117,117,117,117,117,117,117,117,117,117,117,10.931923928,10.617541631,11.524741608,12.178371944,10.550458716,12.044315727,12.493684259,10.15275278,11.155008134,9.8213450566,11.293309843,10.073052316,10.975944389,8.7904038092,11.28440367,10.021606215,10.472647099,12.091005584,10.132465722,11.31793097,-0.361385915,0.5444893144,0.5487972194,3.3879681348,-0.733944954,2.0227095113,2.0210371595,-1.938252804,1.0225424123,-1.496585913,1.4455436599,1.4519715051,0.8231958291,0.1831334127,0.1834862385,0.0919413414,0,0,0,0,1.8069295749,-14.06597396,-5.396505991,-1.648200714,-5.04587156,-0.551648049,-1.653575858,-7.845308967,-5.670462468,-6.360490132,3.2524732349,-12.61400245,-4.573310162,-1.465067302,-4.862385321,-0.459706707,-1.653575858,-7.845308967,-5.670462468,-6.360490132 +050,2,3,17,037,Illinois,DeKalb County,105160,105162,105151,104466,104385,104226,104593,104238,104219,104513,104587,105131,104491,-11,-685,-81,-159,367,-355,-19,294,74,544,-640,348,1270,1197,1165,1179,1220,1172,1101,1100,1114,1084,194,675,686,695,685,719,698,750,756,729,776,154,595,511,470,494,501,474,351,344,385,308,47,157,222,221,201,249,302,359,265,202,156,-221,-1450,-833,-868,-324,-1117,-798,-419,-542,-43,-1106,-174,-1293,-611,-647,-123,-868,-496,-60,-277,159,-950,9,13,19,18,-4,12,3,3,7,0,2,6673,6675,6533,6311,6061,5909,5761,5655,5651,5642,5647,5647,12.117337811,11.46271744,11.169113805,11.292075913,11.684089048,11.24452525,10.549412644,10.521281683,10.623790042,10.34242589,6.4403173407,6.5692766614,6.6631193945,6.5607056829,6.8859508406,6.6968247648,7.1862483951,7.230989957,6.9521929448,7.4038030359,5.6770204707,4.8934407784,4.5059944106,4.7313702297,4.7981382075,4.547700485,3.3631642489,3.2902917264,3.6715970971,2.9386228545,1.4979701074,2.1259175201,2.1187760952,1.9251121785,2.3847034205,2.8974800558,3.4398175651,2.5346724055,1.926396399,1.4883933938,-13.83475577,-7.976978803,-8.321708826,-3.1031659,-10.69764546,-7.656255247,-4.014717437,-5.184122429,-0.410074481,-10.55232752,-12.33678566,-5.851061283,-6.202932731,-1.178053721,-8.312942044,-4.758775191,-0.574899872,-2.649450024,1.516321918,-9.063934129 +050,2,3,17,039,Illinois,De Witt County,16561,16558,16589,16549,16490,16372,16216,16185,16152,15910,15768,15624,15368,31,-40,-59,-118,-156,-31,-33,-242,-142,-144,-256,43,185,196,168,173,179,196,147,160,176,169,17,186,161,173,188,199,196,188,215,194,228,26,-1,35,-5,-15,-20,0,-41,-55,-18,-59,0,0,0,1,2,1,0,1,-1,-2,-1,6,-39,-92,-116,-143,-9,-32,-202,-86,-125,-195,6,-39,-92,-115,-141,-8,-32,-201,-87,-127,-196,-1,0,-2,2,0,-3,-1,0,0,1,-1,249,249,249,249,249,249,249,249,249,249,249,249,11.165429416,11.864765883,10.224575498,10.61740518,11.049041696,12.122336642,9.1697336411,10.101647831,11.21304791,10.906040268,11.225783089,9.7460576894,10.52887834,11.537989444,12.283571495,12.122336642,11.727278398,13.574089273,12.359836901,14.713474445,-0.060353673,2.1187081933,-0.304302842,-0.920584264,-1.234529798,0,-2.557544757,-3.472441442,-1.146788991,-3.807434177,0,0,0.0608605684,0.1227445686,0.0617264899,0,0.0623791404,-0.063135299,-0.127420999,-0.064532783,-2.353793228,-5.569175823,-7.059825939,-8.776236652,-0.555538409,-1.979157003,-12.60058636,-5.429635709,-7.963812436,-12.58389262,-2.353793228,-5.569175823,-6.99896537,-8.653492083,-0.493811919,-1.979157003,-12.53820722,-5.492771008,-8.091233435,-12.6484254 +050,2,3,17,041,Illinois,Douglas County,19980,19971,19977,19863,19881,19853,19898,19827,19732,19616,19449,19450,19510,6,-114,18,-28,45,-71,-95,-116,-167,1,60,64,259,244,268,258,253,288,240,270,230,230,26,192,192,196,222,197,185,209,221,176,186,38,67,52,72,36,56,103,31,49,54,44,7,27,21,6,-1,1,-1,-2,-2,-3,-1,-39,-208,-54,-105,15,-129,-197,-146,-216,-49,17,-32,-181,-33,-99,14,-128,-198,-148,-218,-52,16,0,0,-1,-1,-5,1,0,1,2,-1,0,168,168,168,168,168,168,168,168,168,168,168,168,13.002008032,12.278582931,13.489706549,12.980805514,12.737570799,14.560529842,12.19884111,13.823115321,11.825496799,11.80698152,9.6385542169,9.6618357488,9.8656062818,11.169530326,9.9181875393,9.3531181274,10.623157467,11.314475874,9.0490758117,9.5482546201,3.3634538153,2.616747182,3.6241002668,1.811275188,2.8193832599,5.2074117141,1.5756836434,2.5086394471,2.7764209877,2.2587268994,1.3554216867,1.056763285,0.3020083556,-0.0503132,0.0503461296,-0.050557395,-0.101657009,-0.102393447,-0.15424561,-0.051334702,-10.44176707,-2.717391304,-5.285146222,0.754697995,-6.494650724,-9.959806871,-7.420961675,-11.05849226,-2.51934497,0.8726899384,-9.086345382,-1.660628019,-4.983137867,0.7043847954,-6.444304594,-10.01036427,-7.522618685,-11.1608857,-2.673590581,0.8213552361 +050,2,3,17,043,Illinois,DuPage County,916924,916741,917996,924866,928719,932301,933480,933669,931408,930569,927808,922761,917481,1255,6870,3853,3582,1179,189,-2261,-839,-2761,-5047,-5280,2803,10731,10717,10411,10683,10935,10849,10530,10479,10081,9987,1368,5872,5863,5937,5889,6171,6202,6282,6406,6664,7223,1435,4859,4854,4474,4794,4764,4647,4248,4073,3417,2764,434,3101,2728,2564,2857,3114,2594,3213,2219,1481,1189,-597,-1074,-3736,-3461,-6546,-7738,-9542,-8360,-9106,-9972,-9244,-163,2027,-1008,-897,-3689,-4624,-6948,-5147,-6887,-8491,-8055,-17,-16,7,5,74,49,40,60,53,27,11,12140,12141,13083,13171,12871,12845,12815,12820,12825,12824,12825,12825,11.646015817,11.563537685,11.188488033,11.451504759,11.713044861,11.633836029,11.310558616,11.277582536,10.895027421,10.854007245,6.372696382,6.3261193849,6.380372054,6.3126379784,6.6100777174,6.6506637528,6.7476665931,6.8941877778,7.2021091891,7.8500545037,5.2733194347,5.2374183002,4.8081159794,5.1388667802,5.102967144,4.9831722765,4.5628920228,4.3833947579,3.6929182322,3.003952741,3.3654174865,2.9434851922,2.7554781786,3.0625244871,3.3355666848,2.7816545912,3.4511704495,2.3881053199,1.6005887919,1.2922213491,-1.165578323,-4.031107287,-3.719465669,-7.016900697,-8.288572578,-10.23228532,-8.979702757,-9.799949095,-10.77722582,-10.04650475,2.1998391632,-1.087622094,-0.963987491,-3.95437621,-4.953005893,-7.450630725,-5.528532307,-7.411843776,-9.176637024,-8.754283404 +050,2,3,17,045,Illinois,Edgar County,18576,18576,18509,18397,18170,17959,17827,17625,17538,17415,17379,17169,16858,-67,-112,-227,-211,-132,-202,-87,-123,-36,-210,-311,48,186,186,205,179,165,175,185,186,155,165,81,225,219,265,245,234,250,239,224,219,242,-33,-39,-33,-60,-66,-69,-75,-54,-38,-64,-77,0,0,5,2,4,7,5,12,11,7,2,-32,-74,-202,-155,-68,-140,-16,-82,-7,-153,-233,-32,-74,-197,-153,-64,-133,-11,-70,4,-146,-231,-2,1,3,2,-2,0,-1,1,-2,0,-3,283,283,283,283,283,283,283,283,283,283,282,283,10.079661844,10.1731069,11.348224418,10.003912144,9.3083606002,9.9536444558,10.585643579,10.691498534,8.9730230404,9.6981808564,12.193139327,11.978012963,14.669655955,13.692505449,13.20094776,14.21949208,13.67550711,12.875783181,12.678013199,14.223998589,-2.113477483,-1.804906063,-3.321431537,-3.688593305,-3.89258716,-4.265847624,-3.089863531,-2.184284647,-3.704990159,-4.525817733,0,0.2734706156,0.1107143846,0.2235511094,0.3949001467,0.2843898416,0.6866363402,0.6322929241,0.4052332986,0.1175537074,-4.010188045,-11.04821287,-8.580364804,-3.800368859,-7.898002934,-0.910047493,-4.692014992,-0.402368224,-8.857242098,-13.69500691,-4.010188045,-10.77474225,-8.469650419,-3.57681775,-7.503102787,-0.625657652,-4.005378651,0.2299246997,-8.452008799,-13.5774532 +050,2,3,17,047,Illinois,Edwards County,6721,6726,6739,6674,6725,6691,6631,6514,6546,6455,6393,6405,6356,13,-65,51,-34,-60,-117,32,-91,-62,12,-49,14,74,85,74,84,71,82,65,87,88,92,15,64,80,80,76,77,64,87,69,67,70,-1,10,5,-6,8,-6,18,-22,18,21,22,0,1,1,0,0,0,1,2,1,0,1,14,-77,48,-28,-69,-111,12,-71,-80,-8,-72,14,-76,49,-28,-69,-111,13,-69,-79,-8,-71,0,1,-3,0,1,0,1,0,-1,-1,0,52,52,52,52,52,52,52,52,52,52,52,52,11.034071423,12.687513994,11.031604055,12.610719111,10.802586535,12.557427259,9.9992308284,13.542963885,13.752148773,14.418932686,9.5429806904,11.941189641,11.926058438,11.409698244,11.715481172,9.8009188361,13.383585878,10.740971357,10.470385998,10.970927043,1.4910907329,0.7463243526,-0.894454383,1.2010208677,-0.912894637,2.7565084227,-3.38435505,2.801992528,3.2817627754,3.4480056422,0.1491090733,0.1492648705,0,0,0,0.1531393568,0.3076686409,0.1556662516,0,0.1567275292,-11.48139864,7.1647137846,-4.174120453,-10.35880498,-16.88855078,1.8376722818,-10.92223675,-12.45330012,-1.250195343,-11.2843821,-11.33228957,7.3139786551,-4.174120453,-10.35880498,-16.88855078,1.9908116386,-10.61456811,-12.29763387,-1.250195343,-11.12765457 +050,2,3,17,049,Illinois,Effingham County,34242,34244,34222,34268,34270,34213,34115,34200,34184,34165,34233,34109,34065,-22,46,2,-57,-98,85,-16,-19,68,-124,-44,131,437,444,431,442,447,462,481,462,451,435,97,349,349,372,344,380,359,340,390,337,355,34,88,95,59,98,67,103,141,72,114,80,-1,13,5,20,24,16,30,40,31,20,18,-56,-53,-99,-134,-220,5,-146,-201,-34,-259,-142,-57,-40,-94,-114,-196,21,-116,-161,-3,-239,-124,1,-2,1,-2,0,-3,-3,1,-1,1,0,440,440,440,440,440,440,440,440,440,440,440,440,12.760987005,12.956316204,12.587065403,12.937595129,13.086437825,13.511932616,14.07482187,13.509166935,13.198326066,12.761463314,10.191268798,10.184131431,10.864010046,10.069078562,11.124935958,10.499532054,9.948938536,11.403842218,9.8621638231,10.414527532,2.569718207,2.7721847734,1.7230553568,2.8685165671,1.9615018664,3.0124005615,4.1258833341,2.1053247171,3.3361622428,2.346935782,0.3796174624,0.1459044618,0.5840865616,0.7024938532,0.4684183561,0.8773982218,1.1704633572,0.9064592532,0.5852916216,0.5280605509,-1.547671193,-2.888908343,-3.913379963,-6.439526987,0.1463807363,-4.270004679,-5.88157837,-0.994181116,-7.579526499,-4.165811013,-1.16805373,-2.743003881,-3.329293401,-5.737033134,0.6147990924,-3.392606458,-4.711115013,-0.087721863,-6.994234878,-3.637750462 +050,2,3,17,051,Illinois,Fayette County,22140,22152,22140,22385,22167,22201,22088,22048,21579,21537,21380,21332,21264,-12,245,-218,34,-113,-40,-469,-42,-157,-48,-68,66,234,254,227,249,256,246,245,238,224,220,79,179,247,204,204,236,238,222,227,217,223,-13,55,7,23,45,20,8,23,11,7,-3,5,24,19,0,6,2,3,8,4,3,2,-3,166,-252,16,-164,-60,-483,-72,-173,-60,-68,2,190,-233,16,-158,-58,-480,-64,-169,-57,-66,-1,0,8,-5,0,-2,3,-1,1,2,1,1784,1784,1981,1877,1892,1919,1893,1651,1650,1653,1650,1651,10.510948905,11.402406177,10.232600072,11.244327034,11.600507522,11.277419946,11.364690602,11.091175991,10.488855591,10.329608414,8.0404267266,11.088166637,9.1958168049,9.2122197385,10.694217872,10.910674582,10.29780128,10.578558613,10.161078854,10.47046671,2.4705221786,0.3142395403,1.0367832672,2.0321072953,0.9062896502,0.3667453641,1.0668893218,0.5126173777,0.3277767372,-0.140858297,1.0780460415,0.8529358951,0,0.2709476394,0.090628965,0.1375295115,0.371091938,0.1864063192,0.1404757445,0.093905531,7.4564851207,-11.31262345,0.7212405337,-7.405902143,-2.718868951,-22.14225136,-3.339827442,-8.062073304,-2.80951489,-3.192788055,8.5345311623,-10.45968756,0.7212405337,-7.134954503,-2.628239985,-22.00472185,-2.968735504,-7.875666985,-2.669039146,-3.098882524 +050,2,3,17,053,Illinois,Ford County,14081,14075,14076,13875,13877,13670,13539,13527,13346,13291,13215,12972,12949,1,-201,2,-207,-131,-12,-181,-55,-76,-243,-23,40,131,146,134,160,140,146,160,152,131,141,30,219,183,198,207,203,194,215,210,181,180,10,-88,-37,-64,-47,-63,-48,-55,-58,-50,-39,2,1,1,1,1,2,1,1,1,0,0,-9,-114,37,-147,-85,50,-134,0,-20,-193,16,-7,-113,38,-146,-84,52,-133,1,-19,-193,16,-2,0,1,3,0,-1,0,-1,1,0,0,410,410,410,410,410,410,410,410,410,411,410,411,9.3735465636,10.521764197,9.7288270955,11.760814436,10.345082391,10.865924906,12.013364868,11.469101336,10.004964295,10.879209907,15.670280133,13.188238686,14.375431081,15.215553677,15.000369467,14.438283779,16.142959042,15.84546895,13.823652958,13.888353073,-6.296733569,-2.666474488,-4.646603986,-3.454739241,-4.655287076,-3.572358873,-4.129594174,-4.376367615,-3.818688662,-3.009143166,0.0715537906,0.0720668781,0.0726031873,0.0735050902,0.1477868913,0.0744241432,0.0750835304,0.075454614,0,0,-8.157132124,2.6664744883,-10.67266853,-6.247932669,3.6946722826,-9.972835188,0,-1.509092281,-14.74013824,1.2345202731,-8.085578334,2.7385413664,-10.60006534,-6.174427579,3.8424591739,-9.898411045,0.0750835304,-1.433637667,-14.74013824,1.2345202731 +050,2,3,17,055,Illinois,Franklin County,39561,39996,40035,40038,39872,39561,39456,39398,39090,39024,38737,38530,38060,39,3,-166,-311,-105,-58,-308,-66,-287,-207,-470,117,445,465,471,492,515,471,464,462,468,455,109,537,547,577,513,571,513,511,518,505,557,8,-92,-82,-106,-21,-56,-42,-47,-56,-37,-102,0,19,16,23,9,0,5,7,6,5,5,35,78,-95,-225,-87,3,-269,-24,-235,-175,-371,35,97,-79,-202,-78,3,-264,-17,-229,-170,-366,-4,-2,-5,-3,-6,-5,-2,-2,-2,0,-2,517,517,517,517,517,517,517,517,517,517,517,517,11.114857692,11.638092854,11.859051024,12.45301644,13.062114794,12.001834675,11.880072714,11.882563239,12.113839026,11.881446664,13.412760856,13.690401702,14.527966966,12.984547629,14.482461258,13.072061971,13.083442149,13.322873934,13.071557068,14.544979762,-2.297903163,-2.052308847,-2.668915942,-0.531531189,-1.420346463,-1.070227296,-1.203369434,-1.440310696,-0.957718043,-2.663533098,0.4745669577,0.4004505068,0.5791044025,0.2277990812,0,0.1274080114,0.1792252349,0.1543190031,0.1294213571,0.130565348,1.9482222472,-2.377674884,-5.665151763,-2.202057785,0.0760899891,-6.854551014,-0.61448652,-6.044160955,-4.529747499,-9.687948818,2.4227892049,-1.977224377,-5.086047361,-1.974258704,0.0760899891,-6.727143003,-0.435261285,-5.889841952,-4.400326142,-9.55738347 +050,2,3,17,057,Illinois,Fulton County,37069,37070,37076,36909,36585,36322,35996,35709,35498,35099,34743,34240,33690,6,-167,-324,-263,-326,-287,-211,-399,-356,-503,-550,78,372,352,348,333,337,373,340,325,310,297,72,463,462,416,473,449,494,454,501,443,479,6,-91,-110,-68,-140,-112,-121,-114,-176,-133,-182,1,-1,-2,-1,10,17,11,8,8,5,2,4,-73,-213,-190,-193,-191,-100,-292,-189,-375,-368,5,-74,-215,-191,-183,-174,-89,-284,-181,-370,-366,-5,-2,1,-4,-3,-1,-1,-1,1,0,-2,2683,2683,2684,2683,2744,2699,2682,2682,2682,2681,2682,2685,10.056092451,9.5790132528,9.5464084381,9.2093254791,9.3996234572,10.476498097,9.6321373429,9.3067208843,8.9877216126,8.7442955984,12.516050551,12.572454894,11.411798593,13.081113969,12.523533924,13.875040375,12.861736334,14.346668194,12.843744111,14.102752834,-2.4599581,-2.993441641,-1.865390155,-3.87178849,-3.123910466,-3.398542278,-3.229598991,-5.03994731,-3.856022498,-5.358457235,-0.027032507,-0.054426212,-0.027432208,0.2765563207,0.4741649815,0.3089583889,0.2266385257,0.2290885141,0.1449632518,0.0588841454,-1.973372981,-5.796391542,-5.21211955,-5.337536989,-5.327383028,-2.808712627,-8.272306189,-5.412216145,-10.87224389,-10.83468276,-2.000405488,-5.850817754,-5.239551758,-5.060980669,-4.853218046,-2.499754238,-8.045667663,-5.183127631,-10.72728063,-10.77579862 +050,2,3,17,059,Illinois,Gallatin County,5589,5589,5574,5490,5391,5387,5279,5224,5165,5073,5049,4833,4793,-15,-84,-99,-4,-108,-55,-59,-92,-24,-216,-40,19,57,49,60,54,66,62,46,44,33,33,32,88,70,83,84,84,65,76,93,70,78,-13,-31,-21,-23,-30,-18,-3,-30,-49,-37,-45,0,0,0,0,0,0,0,0,0,0,0,-2,-54,-80,20,-80,-37,-55,-62,26,-178,6,-2,-54,-80,20,-80,-37,-55,-62,26,-178,6,0,1,2,-1,2,0,-1,0,-1,-1,-1,25,25,25,25,25,25,25,25,25,25,25,25,10.303687636,9.0065251356,11.133791056,10.125632852,12.567837761,11.935701222,8.9861301035,8.6939340051,6.6788099575,6.8564305007,15.907447578,12.866464479,15.401744294,15.750984437,15.995429877,12.513235153,14.846649736,18.375815056,14.167172637,16.206108456,-5.603759942,-3.859939344,-4.267953238,-5.625351584,-3.427592117,-0.57753393,-5.860519633,-9.681881051,-7.48836268,-9.349677956,0,0,0,0,0,0,0,0,0,0,-9.761388286,-14.70453083,3.7112636853,-15.00093756,-7.045606017,-10.58812205,-12.11174057,5.1373246394,-36.02509613,1.2466237274,-9.761388286,-14.70453083,3.7112636853,-15.00093756,-7.045606017,-10.58812205,-12.11174057,5.1373246394,-36.02509613,1.2466237274 +050,2,3,17,061,Illinois,Greene County,13886,13886,13890,13857,13657,13635,13416,13345,13111,13153,13051,12922,12702,4,-33,-200,-22,-219,-71,-234,42,-102,-129,-220,39,152,148,139,143,129,121,128,144,138,133,22,136,158,130,148,170,183,179,151,167,177,17,16,-10,9,-5,-41,-62,-51,-7,-29,-44,1,7,6,1,1,2,1,1,1,1,0,-14,-56,-201,-30,-221,-31,-173,93,-96,-100,-177,-13,-49,-195,-29,-220,-29,-172,94,-95,-99,-177,0,0,5,-2,6,-1,0,-1,0,-1,1,284,284,284,284,284,284,284,284,284,284,284,284,10.956139402,10.758159482,10.186135131,10.572622084,9.6408953328,9.1472633807,9.7471824551,10.990688445,10.626419744,10.380892913,9.8028615706,11.48506215,9.5266012018,10.942294185,12.705055865,13.834290898,13.630825465,11.524958022,12.859507951,13.815173275,1.1532778318,-0.726902668,0.6595339294,-0.369672101,-3.064160532,-4.687027517,-3.883643009,-0.534269577,-2.233088207,-3.434280362,0.5045590514,0.4361416006,0.0732815477,0.0739344202,0.1494712455,0.075597218,0.0761498629,0.0763242253,0.0770030416,0,-4.036472411,-14.61074362,-2.198446431,-16.33950686,-2.316804305,-13.07831872,7.0819372525,-7.32712563,-7.700304162,-13.81517328,-3.53191336,-14.17460202,-2.125164883,-16.26557244,-2.167333059,-13.0027215,7.1580871154,-7.250801404,-7.62330112,-13.81517328 +050,2,3,17,063,Illinois,Grundy County,50063,50079,50155,50103,50161,50183,50281,50358,50325,50627,51012,51031,50993,76,-52,58,22,98,77,-33,302,385,19,-38,179,639,627,610,600,630,618,579,589,562,560,68,380,385,361,389,420,387,416,407,439,451,111,259,242,249,211,210,231,163,182,123,109,-1,0,-10,-6,1,6,15,26,17,10,12,-33,-311,-178,-220,-111,-135,-280,116,189,-117,-160,-34,-311,-188,-226,-110,-129,-265,142,206,-107,-148,-1,0,4,-1,-3,-4,1,-3,-3,3,1,254,254,254,254,254,254,254,254,254,254,254,254,12.74711245,12.506981569,12.158175875,11.944577162,12.519997218,12.276153869,11.470798003,11.590039257,11.01496428,10.977809143,7.5804424585,7.6797255246,7.1952483457,7.7440675267,8.3466648119,7.6874944132,8.2415405341,8.0087368038,8.6042158698,8.8410570062,5.1666699914,4.827256044,4.9629275293,4.2005096353,4.1733324059,4.5886594559,3.2292574689,3.5813024528,2.41074841,2.1367521368,0,-0.19947339,-0.119588615,0.0199076286,0.1192380687,0.2979648997,0.5150962834,0.3345172621,0.1959958057,0.2352387673,-6.203993696,-3.550626346,-4.384915889,-2.209746775,-2.682856547,-5.562011462,2.2981218797,3.7190448548,-2.293150927,-3.136516898,-6.203993696,-3.750099737,-4.504504505,-2.189839146,-2.563618478,-5.264046562,2.8132181631,4.0535621169,-2.097155121,-2.901278131 +050,2,3,17,065,Illinois,Hamilton County,8457,8457,8446,8425,8387,8347,8313,8247,8197,8192,8149,8133,8084,-11,-21,-38,-40,-34,-66,-50,-5,-43,-16,-49,25,91,96,79,73,90,99,85,79,79,81,41,111,116,109,111,99,104,100,123,80,117,-16,-20,-20,-30,-38,-9,-5,-15,-44,-1,-36,0,0,1,0,1,0,6,6,5,4,3,6,0,-19,-7,5,-56,-51,5,-4,-17,-16,6,0,-18,-7,6,-56,-45,11,1,-13,-13,-1,-1,0,-3,-2,-1,0,-1,0,-2,0,117,117,117,117,117,117,117,117,117,117,117,117,10.78774228,11.42041399,9.4418549062,8.7635054022,10.869565217,12.040865969,10.372811032,9.66893091,9.7039675716,9.9895171733,13.158674649,13.799666905,13.027369428,13.325330132,11.956521739,12.648990513,12.203307096,15.054158252,9.8268026041,14.429302584,-2.370932369,-2.379252915,-3.585514521,-4.56182473,-1.086956522,-0.608124544,-1.830496064,-5.385227342,-0.122835033,-4.43978541,0,0.1189626457,0,0.1200480192,0,0.7297494527,0.7321984258,0.6119576525,0.4913401302,0.3699821175,0,-2.260290269,-0.836620055,0.600240096,-6.763285024,-6.202870348,0.6101653548,-0.489566122,-2.088195553,-1.97323796,0,-2.141327623,-0.836620055,0.7202881152,-6.763285024,-5.473120895,1.3423637806,0.1223915305,-1.596855423,-1.603255843 +050,2,3,17,067,Illinois,Hancock County,19104,19104,19091,18999,18830,18545,18326,18217,18206,17959,17815,17700,17422,-13,-92,-169,-285,-219,-109,-11,-247,-144,-115,-278,44,184,189,188,194,217,200,171,183,184,179,60,171,211,211,207,198,207,217,217,202,218,-16,13,-22,-23,-13,19,-7,-46,-34,-18,-39,0,3,4,6,4,5,2,3,3,2,1,6,-109,-153,-271,-213,-132,-6,-203,-113,-99,-237,6,-106,-149,-265,-209,-127,-4,-200,-110,-97,-236,-3,1,2,3,3,-1,0,-1,0,0,-3,223,223,223,223,223,223,223,223,223,223,223,223,9.6613284327,9.9923339237,10.060200669,10.523175395,11.876419561,10.982071768,9.4566569888,10.230893945,10.36181895,10.193041399,8.978734576,11.15546274,11.2909699,11.228336633,10.836548723,11.36644428,12.000553021,12.131715771,11.375475151,12.413871647,0.6825938567,-1.163128817,-1.230769231,-0.705161238,1.0398708371,-0.384372512,-2.543896032,-1.900821826,-1.013656202,-2.220830249,0.1575216592,0.2114779666,0.3210702341,0.2169726886,0.2736502203,0.1098207177,0.165906263,0.1677195729,0.1126284668,0.0569443654,-5.723286952,-8.089032224,-14.50167224,-11.55379567,-7.224365816,-0.329462153,-11.22632379,-6.317437245,-5.575109109,-13.49581459,-5.565765293,-7.877554257,-14.18060201,-11.33682298,-6.950715595,-0.219641435,-11.06041753,-6.149717672,-5.462480642,-13.43887022 +050,2,3,17,069,Illinois,Hardin County,4320,4319,4316,4291,4278,4174,4146,4065,3997,3920,3876,3848,3808,-3,-25,-13,-104,-28,-81,-68,-77,-44,-28,-40,11,40,41,25,35,23,43,27,25,37,33,10,58,52,60,70,65,65,77,72,53,68,1,-18,-11,-35,-35,-42,-22,-50,-47,-16,-35,0,0,0,0,0,0,0,0,0,0,0,-3,-7,-1,-70,7,-39,-45,-27,5,-11,-5,-3,-7,-1,-70,7,-39,-45,-27,5,-11,-5,-1,0,-1,1,0,0,-1,0,-2,-1,0,17,17,17,17,17,17,17,17,17,17,17,17,9.294760079,9.5693779904,5.9157595835,8.4134615385,5.6022408964,10.667328206,6.8207654415,6.4135454079,9.5805282237,8.6206896552,13.477402115,12.136772085,14.197823,16.826923077,15.832419924,16.12503101,19.451812555,18.471010775,13.723459347,17.76384535,-4.182642036,-2.567394095,-8.282063417,-8.413461538,-10.23017903,-5.457702803,-12.63104711,-12.05746537,-4.142931124,-9.143155695,0,0,0,0,0,0,0,0,0,0,-1.626583014,-0.233399463,-16.56412683,1.6826923077,-9.499451955,-11.16348301,-6.820765441,1.2827090816,-2.848265148,-1.306165099,-1.626583014,-0.233399463,-16.56412683,1.6826923077,-9.499451955,-11.16348301,-6.820765441,1.2827090816,-2.848265148,-1.306165099 +050,2,3,17,071,Illinois,Henderson County,7331,7329,7344,7221,7048,6969,7018,7001,6889,6824,6726,6709,6535,15,-123,-173,-79,49,-17,-112,-65,-98,-17,-174,17,63,55,58,74,72,61,67,60,61,62,8,91,82,92,67,92,83,85,98,82,92,9,-28,-27,-34,7,-20,-22,-18,-38,-21,-30,0,-2,-1,2,1,2,2,2,2,1,1,7,-93,-151,-51,42,3,-93,-48,-61,2,-144,7,-95,-152,-49,43,5,-91,-46,-59,3,-143,-1,0,6,4,-1,-2,1,-1,-1,1,-1,51,51,51,51,51,51,51,51,51,51,51,51,8.6508753862,7.7090195529,8.2756652636,10.581254022,10.271774021,8.7832973362,9.7717494348,8.8560885609,9.080759211,9.362730293,12.495708891,11.493447333,13.126917315,9.5803245871,13.125044582,11.951043916,12.396995552,14.464944649,12.206922218,13.893083661,-3.844833505,-3.784427781,-4.851252051,1.0009294345,-2.853270561,-3.16774658,-2.625246117,-5.608856089,-3.126163007,-4.530353368,-0.274630965,-0.140163992,0.2853677677,0.1429899192,0.2853270561,0.2879769618,0.291694013,0.295202952,0.1488649051,0.1510117789,-12.77033986,-21.16476277,-7.276878077,6.0055766068,0.4279905842,-13.39092873,-7.000656312,-9.003690037,0.2977298102,-21.74569616,-13.04497082,-21.30492676,-6.991510309,6.1485665261,0.7133176403,-13.10295176,-6.708962299,-8.708487085,0.4465947153,-21.59468439 +050,2,3,17,073,Illinois,Henry County,50486,50487,50459,50293,50263,49932,49841,49654,49511,49222,49082,48933,48411,-28,-166,-30,-331,-91,-187,-143,-289,-140,-149,-522,139,553,538,549,517,578,564,488,504,479,479,107,526,531,515,509,558,540,540,554,537,614,32,27,7,34,8,20,24,-52,-50,-58,-135,0,3,-1,13,9,3,-7,-4,-2,-8,-2,-60,-196,-30,-385,-103,-208,-159,-233,-85,-83,-384,-60,-193,-31,-372,-94,-205,-166,-237,-87,-91,-386,0,0,-6,7,-5,-2,-1,0,-3,0,-1,724,724,725,725,724,726,725,722,721,721,721,722,10.977449579,10.700505191,10.95863067,10.363525202,11.618674305,11.374981092,9.8852460677,10.25390625,9.7740141815,9.8413872452,10.44148007,10.561279287,10.27995409,10.203161176,11.216644052,10.890939344,10.93859196,11.271158854,10.957506504,12.615055884,0.5359695093,0.139225904,0.6786765807,0.1603640263,0.4020302528,0.4840417486,-1.053345892,-1.017252604,-1.183492323,-2.773668639,0.0595521677,-0.019889415,0.2594939867,0.1804095296,0.0603045379,-0.141178843,-0.081026607,-0.040690104,-0.16324032,-0.041091387,-3.890741623,-0.596682446,-7.685014222,-2.064686839,-4.181114629,-3.206776584,-4.719799864,-1.729329427,-1.693618324,-7.889546351,-3.831189455,-0.61657186,-7.425520236,-1.884277309,-4.120810091,-3.347955428,-4.800826471,-1.770019531,-1.856858644,-7.930637738 +050,2,3,17,075,Illinois,Iroquois County,29718,29719,29701,29501,29270,28943,28725,28529,28150,27780,27450,27093,26711,-18,-200,-231,-327,-218,-196,-379,-370,-330,-357,-382,79,313,315,281,307,302,297,339,297,300,292,63,386,384,381,340,403,401,398,397,349,341,16,-73,-69,-100,-33,-101,-104,-59,-100,-49,-49,3,11,12,15,10,5,-1,-1,-2,-2,0,-35,-137,-175,-244,-196,-99,-275,-310,-228,-306,-331,-32,-126,-163,-229,-186,-94,-276,-311,-230,-308,-331,-2,-1,1,2,1,-1,1,0,0,0,-2,468,468,468,468,468,468,468,468,468,469,468,468,10.573967096,10.719572578,9.6542009517,10.647152667,10.549481259,10.480071984,12.122295727,10.755024443,11.000495022,10.854211583,13.040099997,13.067669429,13.089859653,11.791634875,14.077619031,14.149861501,14.232075809,14.376244794,12.797242543,12.675637499,-2.466132901,-2.34809685,-3.435658702,-1.144482209,-3.528137772,-3.669789516,-2.109780082,-3.621220351,-1.79674752,-1.821425916,0.3716090673,0.4083646696,0.5153488052,0.3468127905,0.1746602857,-0.035286438,-0.035758984,-0.072424407,-0.073336633,0,-4.62822202,-5.955318099,-8.383007232,-6.797530693,-3.458273658,-9.703770356,-11.08528518,-8.256382401,-11.22050492,-12.30391792,-4.256612952,-5.546953429,-7.867658427,-6.450717902,-3.283613372,-9.739056794,-11.12104416,-8.328806808,-11.29384156,-12.30391792 +050,2,3,17,077,Illinois,Jackson County,60218,60204,60371,60378,59081,59779,59386,59249,58768,57973,57327,56844,56675,167,7,-1297,698,-393,-137,-481,-795,-646,-483,-169,163,662,675,679,695,730,684,693,593,639,605,74,483,482,494,477,465,433,488,505,480,509,89,179,193,185,218,265,251,205,88,159,96,56,251,265,256,224,204,220,251,187,150,121,29,-423,-1838,254,-861,-610,-960,-1261,-927,-794,-387,85,-172,-1573,510,-637,-406,-740,-1010,-740,-644,-266,-7,0,83,3,26,4,8,10,6,2,1,4087,4088,4051,2916,3842,3792,3741,3591,3586,3584,3587,3587,10.964894119,11.300948443,11.425206125,11.664498804,12.306654866,11.59155037,11.872435562,10.286209887,11.193735712,10.659008624,8.0000662531,8.0697142953,8.3123001851,8.0057063735,7.8391705652,7.337925892,8.3603875245,8.7597571552,8.4084399716,8.9676618011,2.9648278661,3.2312341473,3.1129059398,3.6587924307,4.4674843006,4.2536244778,3.512048038,1.526452732,2.7852957406,1.691346823,4.1573843262,4.4366686478,4.3075887599,3.7594931398,3.4391199899,3.7282764348,4.3001173538,3.2437120555,2.6276374911,2.1318017248,-7.006269203,-30.77206406,4.2739357227,-14.45055176,-10.28364311,-16.26884262,-21.60337842,-16.07979185,-13.90896112,-6.81824188,-2.848884877,-26.33539541,8.5815244826,-10.69105862,-6.844523117,-12.54056619,-17.30326107,-12.83607979,-11.28132363,-4.686440155 +050,2,3,17,079,Illinois,Jasper County,9698,9701,9725,9755,9674,9608,9633,9630,9557,9504,9589,9618,9465,24,30,-81,-66,25,-3,-73,-53,85,29,-153,37,125,103,112,111,125,98,110,111,133,116,9,108,107,118,103,95,108,113,101,82,97,28,17,-4,-6,8,30,-10,-3,10,51,19,0,2,9,8,11,8,2,3,2,1,2,-3,11,-87,-70,8,-40,-65,-54,74,-24,-172,-3,13,-78,-62,19,-32,-63,-51,76,-23,-170,-1,0,1,2,-2,-1,0,1,-1,1,-2,54,54,54,54,54,54,54,54,54,54,54,54,12.833675565,10.602707293,11.617052173,11.537861857,12.978248456,10.215249909,11.541891821,11.627297963,13.849117509,12.157417597,11.088295688,11.014462916,12.239394254,10.706304246,9.8634688262,11.257622348,11.856670689,10.579793642,8.5385536523,10.166116439,1.7453798768,-0.411755623,-0.622342081,0.8315576114,3.1147796293,-1.04237244,-0.314778868,1.047504321,5.3105638569,1.9913011581,0.205338809,0.9264501518,0.8297894409,1.1433917156,0.8306079012,0.2084744879,0.3147788678,0.2095008642,0.1041287031,0.2096106482,1.1293634497,-8.955684801,-7.260657608,0.8315576114,-4.153039506,-6.775420858,-5.666019621,7.7515319751,-2.499088874,-18.02651575,1.3347022587,-8.029234649,-6.430868167,1.974949327,-3.322431605,-6.56694637,-5.351240753,7.9610328393,-2.394960171,-17.8169051 +050,2,3,17,081,Illinois,Jefferson County,38827,38825,38757,38758,38672,38656,38390,38290,38236,38059,37704,37635,37235,-68,1,-86,-16,-266,-100,-54,-177,-355,-69,-400,104,449,458,478,492,522,508,469,469,450,423,144,445,419,464,466,435,421,433,482,465,467,-40,4,39,14,26,87,87,36,-13,-15,-44,10,38,37,55,32,24,21,22,17,5,10,-34,-39,-159,-77,-326,-210,-159,-236,-358,-58,-367,-24,-1,-122,-22,-294,-186,-138,-214,-341,-53,-357,-4,-2,-3,-8,2,-1,-3,1,-1,-1,1,2203,2203,2233,2215,2236,2205,2205,2140,2140,2140,2144,2143,11.584854544,11.830040036,12.362921581,12.771590998,13.615023474,13.276533466,12.294383642,12.380713541,11.946004062,11.299585949,11.481648713,10.822678548,12.000827643,12.096669522,11.345852895,11.002796435,11.350678288,12.72388897,12.344204197,12.474956591,0.1032058311,1.0073614878,0.3620939375,0.6749214755,2.269170579,2.2737370306,0.9437053542,-0.343175429,-0.398200135,-1.175370642,0.9804553957,0.9557019243,1.4225118974,0.8306725852,0.6259780908,0.5488330763,0.5767088276,0.4487678682,0.1327333785,0.2671296915,-1.006256854,-4.106935296,-1.991516656,-8.462476962,-5.477308294,-4.155450435,-6.186512878,-9.450523343,-1.53970719,-9.803659677,-0.025801458,-3.151233372,-0.569004759,-7.631804377,-4.851330203,-3.606617359,-5.60980405,-9.001755474,-1.406973812,-9.536529985 +050,2,3,17,083,Illinois,Jersey County,22985,23011,22997,22885,22717,22610,22500,22268,21965,21892,21738,21667,21616,-14,-112,-168,-107,-110,-232,-303,-73,-154,-71,-51,57,207,239,213,200,189,225,213,217,209,211,39,244,264,268,225,258,245,292,282,239,220,18,-37,-25,-55,-25,-69,-20,-79,-65,-30,-9,3,21,23,27,19,27,6,13,8,5,5,-36,-97,-168,-80,-106,-191,-289,-6,-97,-47,-48,-33,-76,-145,-53,-87,-164,-283,7,-89,-42,-43,1,1,2,1,2,1,0,-1,0,1,1,848,848,856,827,814,819,823,793,795,795,795,795,9.0231463319,10.481996404,9.3983718314,8.8672134782,8.4435310936,10.17339995,9.7133866886,9.9472839789,9.6302269324,9.7497862902,10.635979251,11.578439542,11.825181459,9.9756151629,11.526090064,11.077702168,13.316004287,12.926885171,11.012556157,10.165653952,-1.612832919,-1.096443138,-2.426809628,-1.108401685,-3.082558971,-0.904302218,-3.602617598,-2.979601192,-1.382329225,-0.415867662,0.9153916569,1.0087276874,1.1913429082,0.8423852804,1.2062187277,0.2712906653,0.5928358073,0.3667201467,0.2303882041,0.2310375898,-4.228237653,-7.36809789,-3.529904913,-4.699623143,-8.532880629,-13.06716705,-0.273616526,-4.446481779,-2.165649119,-2.217960862,-3.312845996,-6.359370203,-2.338562005,-3.857237863,-7.326661901,-12.79587638,0.3192192808,-4.079761632,-1.935260915,-1.986923272 +050,2,3,17,085,Illinois,Jo Daviess County,22678,22681,22647,22638,22542,22398,22341,22068,21826,21509,21349,21224,21239,-34,-9,-96,-144,-57,-273,-242,-317,-160,-125,15,40,185,210,184,174,192,180,162,182,155,156,70,242,222,234,257,256,239,264,240,253,267,-30,-57,-12,-50,-83,-64,-59,-102,-58,-98,-111,4,18,8,9,8,-7,-4,-4,-6,-6,-3,-5,32,-90,-101,24,-204,-178,-212,-96,-20,130,-1,50,-82,-92,32,-211,-182,-216,-102,-26,127,-3,-2,-2,-2,-6,2,-1,1,0,-1,-1,167,167,167,167,167,167,167,167,167,167,167,167,8.170475875,9.2961487384,8.1886960392,7.7784483337,8.6468958995,8.2015765253,7.476635514,8.4931634701,7.2816104104,7.3475731814,10.687865739,9.8273572377,10.41388518,11.488857596,11.529194533,10.889871053,12.184146764,11.199776004,11.885467315,12.575654099,-2.517389864,-0.531208499,-2.225189141,-3.710409263,-2.882298633,-2.688294528,-4.70751125,-2.706612534,-4.603856905,-5.228080918,0.7949652203,0.3541389996,0.4005340454,0.3576298084,-0.315251413,-0.182257256,-0.184608284,-0.2799944,-0.28186879,-0.141299484,1.4132715027,-3.984063745,-4.494882065,1.0728894253,-9.187326893,-8.110447897,-9.784239068,-4.479910402,-0.939562634,6.1229776511,2.208236723,-3.629924745,-4.09434802,1.4305192338,-9.502578306,-8.292705153,-9.968847352,-4.759904802,-1.221431424,5.9816781669 +050,2,3,17,087,Illinois,Johnson County,12582,12571,12598,12849,12851,12861,12882,12768,12445,12394,12380,12380,12358,27,251,2,10,21,-114,-323,-51,-14,0,-22,23,125,109,115,110,103,105,105,100,113,100,17,121,118,126,111,128,117,130,158,141,154,6,4,-9,-11,-1,-25,-12,-25,-58,-28,-54,0,0,0,-1,0,0,1,1,1,-1,1,22,244,12,23,23,-89,-316,-26,44,28,32,22,244,12,22,23,-89,-315,-25,45,27,33,-1,3,-1,-1,-1,0,4,-1,-1,1,-1,1553,1553,1772,1709,1765,1802,1702,1272,1275,1276,1275,1272,9.8243407867,8.4824902724,8.9452395769,8.5460125083,8.0311890838,8.3290366081,8.4544466363,8.0729797368,9.1276252019,8.0847279489,9.5099618816,9.1828793774,9.8008711886,8.6237035311,9.9805068226,9.2809265062,10.467410121,12.755307984,11.389337641,12.450481041,0.3143789052,-0.700389105,-0.855631612,-0.077691023,-1.949317739,-0.951889898,-2.012963485,-4.682328247,-2.261712439,-4.365753092,0,0,-0.077784692,0,0,0.0793241582,0.0805185394,0.0807297974,-0.080775444,0.0808472795,19.177113216,0.9338521401,1.7890479154,1.7868935245,-6.93957115,-25.06643398,-2.093482024,3.5521110842,2.2617124394,2.5871129436,19.177113216,0.9338521401,1.7112632234,1.7868935245,-6.93957115,-24.98710982,-2.012963485,3.6328408816,2.1809369952,2.6679602231 +050,2,3,17,089,Illinois,Kane County,515269,515318,516060,519091,520615,522523,525476,528562,530540,532101,532838,532293,531010,742,3031,1524,1908,2953,3086,1978,1561,737,-545,-1283,1818,7095,6957,6762,6759,6771,6741,6561,6388,6209,6211,739,2795,2872,2998,2942,3169,3150,3248,3386,3510,3815,1079,4300,4085,3764,3817,3602,3591,3313,3002,2699,2396,51,488,137,196,527,451,150,272,95,-120,-24,-373,-1755,-2713,-2043,-1335,-918,-1755,-2026,-2369,-3140,-3664,-322,-1267,-2576,-1847,-808,-467,-1605,-1754,-2274,-3260,-3688,-15,-2,15,-9,-56,-49,-8,2,9,16,9,6787,6786,6787,6791,6791,6793,6798,6809,6810,6810,6812,6819,13.708144995,13.38262932,12.964727582,12.89886727,12.847734142,12.729652101,12.348478931,11.99693128,11.658659827,11.682464923,5.4001783315,5.5246386959,5.748041007,5.6145091741,6.0130659426,5.9484355614,6.1130711124,6.3590496733,6.590738604,7.1757532895,8.3079666638,7.8579906243,7.2166865745,7.2843580958,6.8346681998,6.78121654,6.2354078188,5.6378816064,5.0679212228,4.5067116335,0.9428576121,0.2635360381,0.3757892053,1.0057261505,0.8557566236,0.2832588363,0.5119320636,0.1784139749,-0.225324397,-0.045142354,-3.39080965,-5.218783002,-3.917027277,-2.547712355,-1.741872684,-3.314128384,-3.813141033,-4.449081121,-5.895988381,-6.891732648,-2.447952038,-4.955246964,-3.541238072,-1.541986204,-0.88611606,-3.030869548,-3.301208969,-4.270667146,-6.121312777,-6.936875002 +050,2,3,17,091,Illinois,Kankakee County,113449,113450,113420,113532,112995,112764,111916,111786,111066,110530,109863,109569,108594,-30,112,-537,-231,-848,-130,-720,-536,-667,-294,-975,370,1342,1380,1331,1362,1336,1309,1357,1240,1238,1205,300,1011,1019,1077,1086,1108,1159,1213,1156,1214,1280,70,331,361,254,276,228,150,144,84,24,-75,14,116,81,60,66,68,30,20,8,11,14,-108,-333,-993,-539,-1212,-418,-899,-699,-763,-332,-914,-94,-217,-912,-479,-1146,-350,-869,-679,-755,-321,-900,-6,-2,14,-6,22,-8,-1,-1,4,3,0,5107,5107,5174,5156,5683,5679,6202,6256,6267,6269,6271,6270,11.826289259,12.183978069,11.791335008,12.12390956,11.944461829,11.747706998,12.247513493,11.252625991,11.283677859,11.046786119,8.909372907,8.9967200378,9.5411478612,9.6670820723,9.9060357082,10.401522086,10.947851044,10.490351327,11.064931277,11.734345421,2.9169163524,3.1872580311,2.2501871465,2.456827488,2.0384261205,1.346184912,1.2996624488,0.7622746639,0.2187465821,-0.687559302,1.0222425887,0.7151465388,0.5315402708,0.5875022254,0.60795165,0.2692369824,0.1805086734,0.072597587,0.1002588501,0.128344403,-2.934541225,-8.767166828,-4.775003433,-10.78867723,-3.737114554,-8.068134906,-6.308778137,-6.923994864,-3.025994386,-8.379056027,-1.912298636,-8.052020289,-4.243463162,-10.201175,-3.129162904,-7.798897923,-6.128269463,-6.851397277,-2.925735535,-8.250711624 +050,2,3,17,093,Illinois,Kendall County,114736,114800,115369,116817,118255,119582,121385,122892,124549,126163,127663,128900,130638,569,1448,1438,1327,1803,1507,1657,1614,1500,1237,1738,508,1726,1688,1711,1680,1624,1616,1552,1478,1514,1482,145,493,485,529,535,572,571,610,546,619,660,363,1233,1203,1182,1145,1052,1045,942,932,895,822,12,114,104,105,171,131,115,140,100,61,62,184,104,156,62,513,339,502,535,475,280,854,196,218,260,167,684,470,617,675,575,341,916,10,-3,-25,-22,-26,-15,-5,-3,-7,1,0,208,208,208,208,208,208,208,208,208,208,208,208,14.867390799,14.36155731,14.38800523,13.943818033,13.296380748,13.061699557,12.380739653,11.645773089,11.802169448,11.420292982,4.246595402,4.1263953172,4.4484247615,4.4404420522,4.6832079975,4.6152416132,4.8661412298,4.3021597472,4.8253255536,5.0859604374,10.620795397,10.235161993,9.939580469,9.5033759809,8.6131727506,8.4464579435,7.5145984237,7.3436133414,6.9768438941,6.3343325448,0.9819713506,0.8848352845,0.8829576559,1.4192814784,1.0725528805,0.9295145105,1.1168192986,0.7879413456,0.4755167347,0.4777720411,0.8958335128,1.3272529268,0.521365473,4.2578444351,2.7755376069,4.0575329068,4.2678451769,3.7427213918,2.1826997657,6.580924566,1.8778048633,2.2120882113,1.4043231289,5.6771259135,3.8480904874,4.9870474174,5.3846644756,4.5306627375,2.6582165004,7.058696607 +050,2,3,17,095,Illinois,Knox County,52919,52923,52911,52702,52302,52130,51945,51377,50931,50601,50008,49669,49053,-12,-209,-400,-172,-185,-568,-446,-330,-593,-339,-616,122,518,540,557,558,581,561,590,569,544,530,172,694,689,727,637,709,698,665,673,621,617,-50,-176,-149,-170,-79,-128,-137,-75,-104,-77,-87,17,68,57,85,105,96,93,104,87,72,54,29,-97,-306,-77,-206,-537,-401,-360,-577,-333,-580,46,-29,-249,8,-101,-441,-308,-256,-490,-261,-526,-8,-4,-2,-10,-5,1,-1,1,1,-1,-3,3955,3955,3948,3957,3962,3956,3955,3926,3931,3932,3935,3931,9.8093984642,10.285322464,10.667228436,10.723036272,11.246394766,10.96688431,11.6219517,11.311115308,10.915256278,10.737221693,13.142321495,13.123309588,13.922935499,12.241172232,13.724085867,13.645071744,13.099318441,13.378524784,12.460246597,12.499746764,-3.33292303,-2.837987124,-3.255707063,-1.51813596,-2.477691102,-2.678187434,-1.477366742,-2.067409476,-1.544990319,-1.76252507,1.2877202617,1.0856729267,1.6278535315,2.0177756426,1.8582683262,1.818039645,2.0486152149,1.7294675427,1.4446662721,1.0939810782,-1.836895079,-5.828349396,-1.474643787,-3.958683642,-10.39468845,-7.839074168,-7.091360359,-11.47014681,-6.681581508,-11.75016714,-0.549174817,-4.742676469,0.1532097441,-1.940907999,-8.536420123,-6.021034523,-5.042745144,-9.740679263,-5.236915236,-10.65618606 +050,2,3,17,097,Illinois,Lake County,703462,703396,704179,701652,702117,704259,704359,704687,704401,702825,700455,697134,693593,783,-2527,465,2142,100,328,-286,-1576,-2370,-3321,-3541,2228,8152,8088,7958,7733,7930,7753,7501,7351,7091,6927,1018,4029,4232,4318,4359,4512,4462,4682,4681,4833,5168,1210,4123,3856,3640,3374,3418,3291,2819,2670,2258,1759,305,1218,2054,1652,1702,2138,1498,1659,926,563,542,-731,-7922,-5551,-3181,-5091,-5259,-5100,-6100,-6015,-6166,-5843,-426,-6704,-3497,-1529,-3389,-3121,-3602,-4441,-5089,-5603,-5301,-1,54,106,31,115,31,25,46,49,24,1,20712,20742,18023,18467,18767,18055,18637,18538,18685,18817,18828,18830,11.597411069,11.523263443,11.317030439,10.979555848,11.255842606,11.004280783,10.660689896,10.476882732,10.147475402,9.9616962927,5.7318411673,6.0294820587,6.1406053573,6.1890448653,6.4043331446,6.3331743653,6.6542261158,6.6715124565,6.9161963925,7.4320840826,5.8655699014,5.4937813843,5.1764250812,4.7905109831,4.851509461,4.6711064178,4.0064637805,3.8053702754,3.2312790098,2.52961221,1.732782959,2.9264074075,2.3493006138,2.4165529618,3.0346773633,2.126197938,2.3578302277,1.3197651217,0.8056731986,0.7794484467,-11.27020246,-7.908708627,-4.523683567,-7.228361415,-7.464625002,-7.238724622,-8.669538511,-8.572772362,-8.823767216,-8.402799399,-9.537419505,-4.982301219,-2.174382953,-4.811808453,-4.429947638,-5.112526684,-6.311708283,-7.25300724,-8.018094018,-7.623350952 +050,2,3,17,099,Illinois,LaSalle County,113924,113911,113812,113527,112913,112419,111650,111015,110176,109590,109136,108517,107571,-99,-285,-614,-494,-769,-635,-839,-586,-454,-619,-946,291,1238,1171,1122,1225,1235,1256,1226,1180,1051,1059,271,1302,1314,1300,1290,1357,1331,1300,1378,1263,1270,20,-64,-143,-178,-65,-122,-75,-74,-198,-212,-211,9,66,38,41,48,44,26,34,22,11,8,-122,-283,-506,-345,-757,-555,-789,-547,-277,-420,-743,-113,-217,-468,-304,-709,-511,-763,-513,-255,-409,-735,-6,-4,-3,-12,5,-2,-1,1,-1,2,0,2950,2950,3173,3170,3588,3563,3556,3386,3386,3386,3384,3384,10.891224119,10.342695637,9.9586388085,10.934131897,11.092897402,11.35670077,11.157321879,10.789755219,9.6575742122,9.8015623265,11.454259938,11.60572337,11.538529814,11.514310324,12.188713987,12.034847711,11.830765451,12.600239569,11.605629144,11.754470401,-0.563035819,-1.263027734,-1.579891005,-0.580178427,-1.095816585,-0.678146941,-0.673443572,-1.81048435,-1.948054931,-1.952908074,0.5806306881,0.3356297474,0.3639074787,0.4284394539,0.395212539,0.2350909395,0.3094200195,0.2011649278,0.1010783219,0.074043908,-2.489674011,-4.469175057,-3.062148297,-6.756847221,-4.985067253,-7.134105818,-4.978022078,-2.532849318,-3.85935411,-6.876827959,-1.909043323,-4.13354531,-2.698240818,-6.328407767,-4.589854714,-6.899014879,-4.668602059,-2.331684391,-3.758275788,-6.802784051 +050,2,3,17,101,Illinois,Lawrence County,16833,16903,16940,16904,16732,16728,16564,16467,16176,16025,15816,15665,15467,37,-36,-172,-4,-164,-97,-291,-151,-209,-151,-198,51,158,165,170,179,191,150,155,147,143,143,33,216,220,182,178,216,234,192,203,201,220,18,-58,-55,-12,1,-25,-84,-37,-56,-58,-77,0,0,1,-2,2,6,3,3,3,0,-1,18,22,-119,12,-169,-79,-211,-116,-156,-92,-120,18,22,-118,10,-167,-73,-208,-113,-153,-92,-121,1,0,1,-2,2,1,1,-1,0,-1,0,2541,2541,2541,2504,2589,2580,2544,2419,2420,2421,2420,2419,9.3369578064,9.8109168748,10.16138673,10.753334134,11.564893585,9.190331771,9.6270302165,9.2333783487,9.084844827,9.1866889374,12.764448647,13.0812225,10.878661088,10.693259642,13.078623112,14.336917563,11.925095494,12.750855815,12.769607065,14.133367596,-3.42749084,-3.270305625,-0.717274357,0.0600744924,-1.513729527,-5.146585792,-2.298065277,-3.517477466,-3.684762238,-4.946678659,0,0.0594601023,-0.119545726,0.1201489847,0.3632950864,0.1838066354,0.1863296171,0.1884362928,0,-0.06424258,1.3000827325,-7.07575217,0.7172743574,-10.15258921,-4.783385305,-12.92773336,-7.204745194,-9.798687227,-5.844795273,-7.709109598,1.3000827325,-7.016292068,0.5977286312,-10.03244023,-4.420090218,-12.74392672,-7.018415577,-9.610250934,-5.844795273,-7.773352178 +050,2,3,17,103,Illinois,Lee County,36031,36034,35978,35611,35218,35123,34912,34521,34499,34533,34281,34061,33647,-56,-367,-393,-95,-211,-391,-22,34,-252,-220,-414,67,351,374,363,363,330,343,354,339,334,326,44,372,335,360,377,375,362,383,377,393,428,23,-21,39,3,-14,-45,-19,-29,-38,-59,-102,0,4,4,2,7,7,6,0,-2,-3,0,-79,-350,-449,-94,-204,-354,-6,66,-212,-157,-311,-79,-346,-445,-92,-197,-347,0,66,-214,-160,-311,0,0,13,-6,0,1,-3,-3,0,-1,-1,2872,2872,2929,2889,3046,2967,2931,3036,3039,3039,3042,3033,9.8059757784,10.560646063,10.321149827,10.366245449,9.5055665174,9.939148073,10.256113107,9.8526462638,9.7743700799,9.6295858687,10.39265809,9.4594022223,10.235851068,10.766045549,10.801780133,10.489713127,11.096303164,10.957072689,11.500980363,12.642523779,-0.586682312,1.1012438408,0.0852987589,-0.3998001,-1.296213616,-0.550565054,-0.840190057,-1.104426425,-1.726610284,-3.01293791,0.1117490117,0.1129480862,0.0568658393,0.19990005,0.2016332292,0.1738626485,0,-0.058127707,-0.087793743,0,-9.778038525,-12.67842268,-2.672694446,-5.825658599,-10.19688045,-0.173862649,1.912156681,-6.161536897,-4.594539229,-9.186506764,-9.666289514,-12.56547459,-2.615828606,-5.625758549,-9.995247217,0,1.912156681,-6.219664603,-4.682332972,-9.186506764 +050,2,3,17,105,Illinois,Livingston County,38950,38951,38862,38813,38519,37404,37043,36615,36104,36080,35630,35557,35414,-89,-49,-294,-1115,-361,-428,-511,-24,-450,-73,-143,129,436,428,415,384,399,415,410,438,420,427,140,382,454,442,406,420,422,441,479,411,389,-11,54,-26,-27,-22,-21,-7,-31,-41,9,38,3,20,28,12,36,40,7,11,7,6,4,-83,-123,-302,-1142,-379,-453,-513,-2,-417,-89,-185,-80,-103,-274,-1130,-343,-413,-506,9,-410,-83,-181,2,0,6,42,4,6,2,-2,1,1,0,3390,3390,3375,3372,2629,2716,2607,2306,2314,2321,2323,2310,11.226263276,11.069156365,10.932128604,10.316063777,10.833853757,11.41379832,11.35985814,12.215869474,11.799907286,12.033083936,9.835854522,11.741581751,11.643375525,10.907088264,11.404056586,11.606320219,12.218774244,13.359364105,11.54705213,10.962224007,1.3904087544,-0.672425387,-0.711246921,-0.591024487,-0.570202829,-0.192521899,-0.858916103,-1.143494631,0.2528551561,1.0708599287,0.5149662053,0.7241504164,0.3161097428,0.9671309791,1.0861006272,0.1925218994,0.3047766818,0.1952307907,0.1685701041,0.1127220978,-3.167042163,-7.810479491,-30.08311052,-10.18174003,-12.3000896,-14.10910491,-0.055413942,-11.6301771,-2.500456544,-5.213397021,-2.652075958,-7.086329075,-29.76700078,-9.214609051,-11.21398898,-13.91658301,0.2493627397,-11.43494631,-2.33188644,-5.100674924 +050,2,3,17,107,Illinois,Logan County,30305,30305,30282,30271,30359,29829,29660,29286,29167,29035,28873,28633,28383,-23,-11,88,-530,-169,-374,-119,-132,-162,-240,-250,76,306,267,301,322,327,300,291,289,301,287,66,313,298,341,337,365,346,342,388,312,317,10,-7,-31,-40,-15,-38,-46,-51,-99,-11,-30,1,18,19,8,12,15,17,19,13,10,9,-32,-21,101,-515,-166,-354,-88,-99,-76,-238,-227,-31,-3,120,-507,-154,-339,-71,-80,-63,-228,-218,-2,-1,-1,17,0,3,-2,-1,0,-1,-2,4361,4361,4422,4760,4335,4323,4166,4143,4138,4140,4137,4142,10.106848546,8.8075210292,10.001993753,10.82553077,11.094900417,10.264657075,9.9996563692,9.9813497272,10.468472855,10.067349516,10.338050964,9.8301171037,11.331162358,11.329825682,12.384216062,11.83857116,11.752173465,13.400566416,10.85104163,11.119685702,-0.231202418,-1.022596075,-1.329168605,-0.504294912,-1.289315645,-1.573914085,-1.752517096,-3.419216689,-0.382568775,-1.052336186,0.5945205027,0.6267524328,0.265833721,0.4034359293,0.5089403861,0.5816639009,0.6528985258,0.44898805,0.3477897958,0.3157008559,-0.693607253,3.3316839848,-17.11304579,-5.580863689,-12.01099311,-3.010966075,-3.40194495,-2.624853215,-8.277397141,-7.962677143,-0.09908675,3.9584364176,-16.84721207,-5.17742776,-11.50205273,-2.429302174,-2.749046425,-2.175865165,-7.929607345,-7.646976287 +050,2,3,17,109,Illinois,McDonough County,32612,32616,32631,32527,32567,32264,31811,31461,30938,30419,30091,29792,29295,15,-104,40,-303,-453,-350,-523,-519,-328,-299,-497,75,306,293,304,304,262,284,289,264,248,246,52,300,286,328,290,327,335,309,308,311,308,23,6,7,-24,14,-65,-51,-20,-44,-63,-62,13,36,48,90,82,93,93,127,99,79,55,-18,-147,-8,-382,-564,-382,-569,-631,-386,-317,-487,-5,-111,40,-292,-482,-289,-476,-504,-287,-238,-432,-3,1,-7,13,15,4,4,5,3,2,-3,4036,4036,4016,4017,3828,3693,3560,3323,3326,3327,3326,3326,9.3925534854,9.0023658094,9.3782295507,9.4888802185,8.2817043874,9.1027099793,9.4202780449,8.7258304412,8.2828181621,8.3267046897,9.20838577,8.7872922236,10.118616094,9.0518923137,10.336325705,10.73735156,10.072200401,10.180135515,10.386921163,10.425305059,0.1841677154,0.2150735859,-0.740386543,0.4369879048,-2.054621317,-1.634641581,-0.651922356,-1.454305074,-2.104103001,-2.098600369,1.1050062924,1.4747903033,2.776449538,2.5595005853,2.9396889619,2.9808170003,4.1397069609,3.2721864155,2.6384783661,1.8616616176,-4.512109027,-0.245798384,-11.78448582,-17.60436988,-12.07485144,-18.23747175,-20.56815033,-12.75822178,-10.58731192,-16.48416741,-3.407102735,1.2289919194,-9.008036279,-15.04486929,-9.135162473,-15.25665475,-16.42844337,-9.486035366,-7.948833559,-14.6225058 +050,2,3,17,111,Illinois,McHenry County,308760,308886,309121,308519,308248,307629,307425,307595,307142,307842,308145,307439,305888,235,-602,-271,-619,-204,170,-453,700,303,-706,-1551,878,3367,3332,3141,3180,3332,3149,3145,3092,3001,2957,492,1913,1893,1965,2003,2074,2047,2112,2268,2178,2389,386,1454,1439,1176,1177,1258,1102,1033,824,823,568,29,238,141,206,156,107,55,108,41,-83,-28,-171,-2306,-1883,-2031,-1563,-1196,-1616,-435,-560,-1453,-2092,-142,-2068,-1742,-1825,-1407,-1089,-1561,-327,-519,-1536,-2120,-9,12,32,30,26,1,6,-6,-2,7,1,1647,1647,1647,1647,1647,1647,1648,1648,1648,1648,1648,1648,10.90279127,10.804728528,10.200088654,10.340555463,10.835419986,10.245031615,10.227908368,10.039172905,9.7500909705,9.6424908735,6.1945469853,6.1384607153,6.3811442869,6.5132492432,6.7444961139,6.6597585634,6.8684713749,7.3637917683,7.0762073088,7.7902978346,4.7082442847,4.6662678126,3.8189443671,3.8273062203,4.0909238724,3.5852730517,3.3594369935,2.6753811363,2.6738836617,1.8521930389,0.7706754744,0.4572229059,0.6689647446,0.5072725322,0.347956164,0.1789383102,0.3512286499,0.1331196925,-0.269662629,-0.091305291,-7.467132958,-6.106033559,-6.595472797,-5.082480563,-3.889304413,-5.257532896,-1.414670951,-1.81822019,-4.720720487,-6.821809573,-6.696457483,-5.648810653,-5.926508053,-4.575208031,-3.541348249,-5.078594586,-1.063442301,-1.685100497,-4.990383116,-6.913114864 +050,2,3,17,113,Illinois,McLean County,169572,169578,169815,170939,172762,175087,174166,173222,173157,172769,172368,171272,171256,237,1124,1823,2325,-921,-944,-65,-388,-401,-1096,-16,527,2149,2078,2218,2056,2092,2103,2005,1902,1789,1752,327,1100,1043,1182,1115,1179,1172,1172,1250,1242,1318,200,1049,1035,1036,941,913,931,833,652,547,434,118,643,627,668,749,768,609,720,536,399,323,-65,-569,194,630,-2681,-2661,-1611,-1954,-1598,-2047,-781,53,74,821,1298,-1932,-1893,-1002,-1234,-1062,-1648,-458,-16,1,-33,-9,70,36,6,13,9,5,8,10676,10678,10732,10817,10587,10541,10489,10488,10498,10507,10506,10506,12.613204834,12.091905464,12.752659919,11.773699868,12.044169632,12.14276847,11.592074606,11.021710219,10.412059132,10.229820628,6.456270506,6.0692287773,6.7960523101,6.3850561055,6.7877992331,6.7671538979,6.7760156797,7.2435004071,7.2284949366,7.6957212257,6.156934328,6.022676687,5.9566076085,5.3886437625,5.2563703985,5.3756145725,4.8160589259,3.7782098123,3.1835641951,2.5340994021,3.7739835776,3.64852008,3.8407469908,4.2891542807,4.4215689661,3.5163794572,4.162740008,3.1060129746,2.3221976487,1.8859772048,-3.339652653,1.1288881906,3.6222613835,-15.35276719,-15.3200456,-9.301949599,-11.29721385,-9.26009092,-11.91363054,-4.560211136,0.4343309249,4.7774082706,7.4630083743,-11.06361291,-10.89847663,-5.785570141,-7.134473847,-6.154077946,-9.591432895,-2.674233931 +050,2,3,17,115,Illinois,Macon County,110768,110777,110786,110699,110162,109596,108562,107398,106411,105474,104529,104012,103015,9,-87,-537,-566,-1034,-1164,-987,-937,-945,-517,-997,358,1387,1319,1387,1354,1380,1313,1294,1333,1247,1234,249,1173,1185,1176,1267,1335,1230,1213,1286,1199,1245,109,214,134,211,87,45,83,81,47,48,-11,21,75,76,65,74,54,47,58,37,31,20,-118,-373,-749,-844,-1216,-1270,-1121,-1078,-1028,-596,-1003,-97,-298,-673,-779,-1142,-1216,-1074,-1020,-991,-565,-983,-3,-3,2,2,21,7,4,2,-1,0,-3,4059,4059,4090,4116,4145,4181,4140,4006,4007,4010,4009,4009,12.524550195,11.944163976,12.622976183,12.413021755,12.780144471,12.28199,12.214172782,12.695056737,11.959278991,11.921150381,10.592139423,10.730731093,10.702682041,11.615434685,12.36340063,11.505596116,11.449607098,12.247444084,11.498937859,12.027416714,1.9324107727,1.2134328831,1.9202941417,0.7975870699,0.4167438415,0.7763938843,0.7645656842,0.4476126532,0.460341132,-0.106266332,0.6772467661,0.6882156651,0.5915598067,0.6784073928,0.5000926097,0.4396447296,0.5474667862,0.3523759184,0.2973036477,0.1932115135,-3.368173917,-6.782546489,-7.681176567,-11.14788364,-11.7614373,-10.48599451,-10.17533096,-9.790336329,-5.715902388,-9.689557401,-2.690927151,-6.094330823,-7.08961676,-10.46947625,-11.26134469,-10.04634978,-9.627864172,-9.43796041,-5.418598741,-9.496345887 +050,2,3,17,117,Illinois,Macoupin County,47765,47764,47798,47742,47058,46685,46216,45887,45708,45521,45342,45079,44567,34,-56,-684,-373,-469,-329,-179,-187,-179,-263,-512,120,496,445,452,442,450,462,458,443,479,451,135,533,557,557,577,547,569,589,577,543,603,-15,-37,-112,-105,-135,-97,-107,-131,-134,-64,-152,2,10,7,10,5,3,7,8,4,3,4,51,-28,-593,-281,-341,-232,-78,-61,-46,-202,-363,53,-18,-586,-271,-336,-229,-71,-53,-42,-199,-359,-4,-1,14,3,2,-3,-1,-3,-3,0,-1,876,876,868,856,835,848,856,861,863,863,863,863,10.383085619,9.388185654,9.6433867062,9.5155057534,9.7716686753,10.087886893,10.040666893,9.7509437285,10.594883932,10.06179863,11.157630312,11.751054852,11.883553972,12.421825384,11.878006145,12.424258966,12.912560699,12.700439123,12.01048429,13.452914798,-0.774544693,-2.362869198,-2.240167266,-2.906319631,-2.10633747,-2.336372073,-2.871893806,-2.949495394,-1.415600358,-3.391116168,0.2093364036,0.1476793249,0.2133492634,0.1076414678,0.0651444578,0.1528467711,0.1753828278,0.0880446386,0.0663562668,0.0892398992,-0.58614193,-12.51054852,-5.995114302,-7.341148104,-5.037838073,-1.703149735,-1.337294062,-1.012513344,-4.467988631,-8.098520849,-0.376805526,-12.3628692,-5.781765038,-7.233506636,-4.972693615,-1.550302964,-1.161911234,-0.924468706,-4.401632364,-8.00928095 +050,2,3,17,119,Illinois,Madison County,269282,269296,269315,268666,268124,267340,266662,266112,265773,265516,264481,263609,262635,19,-649,-542,-784,-678,-550,-339,-257,-1035,-872,-974,821,3230,3181,3077,3106,3133,3026,2984,2950,2782,2754,666,2644,2626,2791,2774,2897,2810,2859,3050,2854,3027,155,586,555,286,332,236,216,125,-100,-72,-273,36,149,162,107,82,67,84,116,81,53,41,-150,-1383,-1255,-1174,-1085,-832,-628,-488,-1016,-861,-754,-114,-1234,-1093,-1067,-1003,-765,-544,-372,-935,-808,-713,-22,-1,-4,-3,-7,-21,-11,-10,0,8,12,3807,3807,3853,3858,3822,3851,3884,3950,3948,3951,3952,3950,12.007859014,11.851934649,11.49283612,11.632915233,11.761084437,11.378399466,11.233057714,11.132138484,10.536082865,10.466627648,9.8293434155,9.7840868869,10.424603708,10.389474197,10.875155319,10.56619382,10.762504023,11.50949911,10.808763658,11.504169169,2.1785155981,2.0678477617,1.0682324115,1.2434410358,0.8859291182,0.812205646,0.4705536911,-0.377360627,-0.272680793,-1.037541521,0.5539229081,0.6035879953,0.3996533847,0.3071149546,0.2515137751,0.3158577512,0.4366738254,0.3056621075,0.2007233615,0.155821254,-5.141445516,-4.675944038,-4.384981997,-4.063655192,-3.123275535,-2.361412711,-1.83704161,-3.833983966,-3.260807817,-2.865590867,-4.587522608,-4.072356042,-3.985328612,-3.756540238,-2.87176176,-2.04555496,-1.400367785,-3.528321858,-3.060084455,-2.709769613 +050,2,3,17,121,Illinois,Marion County,39437,39437,39416,39147,39018,38685,38573,38381,38057,37757,37453,37309,37045,-21,-269,-129,-333,-112,-192,-324,-300,-304,-144,-264,122,491,504,477,491,527,490,488,476,468,455,169,553,493,497,494,531,528,555,517,504,418,-47,-62,11,-20,-3,-4,-38,-67,-41,-36,37,0,7,11,11,27,26,17,19,14,13,10,30,-213,-148,-327,-132,-212,-302,-253,-278,-121,-311,30,-206,-137,-316,-105,-186,-285,-234,-264,-108,-301,-4,-1,-3,3,-4,-2,-1,1,1,0,0,758,758,758,758,758,758,758,758,759,759,758,759,12.499522676,12.895797352,12.277518243,12.710657796,13.696494009,12.820848269,12.873611734,12.657891238,12.519729274,12.238749765,14.077873808,12.614341457,12.792298882,12.788319656,13.800452218,13.815118135,14.641095312,13.748171786,13.482785372,11.243510773,-1.578351132,0.2814558946,-0.514780639,-0.07766186,-0.103958209,-0.994269866,-1.767483578,-1.090280548,-0.963056098,0.9952389918,0.1782009343,0.2814558946,0.2831293515,0.6989567423,0.6757283572,0.44480494,0.5012266864,0.3722909188,0.3477702576,0.2689835113,-5.422399857,-3.786861127,-8.416663449,-3.417121851,-5.509785066,-7.901828933,-6.674229034,-7.392633958,-3.236938552,-8.365387202,-5.244198923,-3.505405233,-8.133534098,-2.718165109,-4.834056709,-7.457023993,-6.173002348,-7.020343039,-2.889168294,-8.09640369 +050,2,3,17,123,Illinois,Marshall County,12640,12647,12637,12488,12261,12129,11966,11925,11887,11667,11485,11463,11309,-10,-149,-227,-132,-163,-41,-38,-220,-182,-22,-154,26,122,95,133,114,142,137,112,106,130,122,25,170,164,153,164,159,165,171,179,147,139,1,-48,-69,-20,-50,-17,-28,-59,-73,-17,-17,2,0,-1,3,2,1,1,1,1,1,1,-12,-102,-158,-117,-115,-23,-10,-163,-109,-6,-138,-10,-102,-159,-114,-113,-22,-9,-162,-108,-5,-137,-1,1,1,2,0,-2,-1,1,-1,0,0,255,255,255,255,255,255,255,255,255,255,255,255,9.7114427861,7.6770778617,10.906109061,9.4625440963,11.887321586,11.506803292,9.5100619852,9.1568762958,11.329963396,10.714913051,13.532338308,13.25306073,12.546125461,13.612782735,13.310451635,13.85855871,14.519826781,15.463026952,12.811573993,12.207974706,-3.820895522,-5.575982868,-1.6400164,-4.150238639,-1.423130049,-2.351755417,-5.009764796,-6.306150657,-1.481610598,-1.493061655,0,-0.080811346,0.24600246,0.1660095455,0.0837135323,0.0839912649,0.0849112677,0.0863856254,0.0871535646,0.0878271562,-8.119402985,-12.76819265,-9.594095941,-9.545548869,-1.925411243,-0.839912649,-13.84053664,-9.416033172,-0.522921387,-12.12014755,-8.119402985,-12.849004,-9.348093481,-9.379539324,-1.84169771,-0.755921384,-13.75562537,-9.329647547,-0.435767823,-12.03232039 +050,2,3,17,125,Illinois,Mason County,14666,14666,14651,14470,14322,14144,14102,13862,13677,13672,13520,13387,13173,-15,-181,-148,-178,-42,-240,-185,-5,-152,-133,-214,48,152,129,140,143,122,140,130,119,134,127,35,204,187,213,174,182,202,172,212,162,178,13,-52,-58,-73,-31,-60,-62,-42,-93,-28,-51,1,2,3,0,0,0,0,0,0,0,0,-29,-130,-97,-103,-8,-183,-123,38,-58,-105,-163,-28,-128,-94,-103,-8,-183,-123,38,-58,-105,-163,0,-1,4,-2,-3,3,0,-1,-1,0,0,206,206,206,206,206,206,206,206,206,206,206,206,10.43920195,8.9608224507,9.836295932,10.12532748,8.7255042197,10.167398961,9.5067461333,8.7525742866,9.9602333965,9.563253012,14.010507881,12.989719366,14.965221668,12.320328542,13.016735803,14.670104216,12.578156423,15.592821418,12.041476196,13.403614458,-3.57130593,-4.028896916,-5.128925736,-2.195001062,-4.291231583,-4.502705254,-3.071410289,-6.840247132,-2.081242799,-3.840361446,0.1373579204,0.2083912198,0,0,0,0,0,0,0,0,-8.928264826,-6.737982773,-7.236703436,-0.566451887,-13.08825633,-8.93278623,2.7788950236,-4.265960577,-7.804660497,-12.27409639,-8.790906906,-6.529591553,-7.236703436,-0.566451887,-13.08825633,-8.93278623,2.7788950236,-4.265960577,-7.804660497,-12.27409639 +050,2,3,17,127,Illinois,Massac County,15429,15429,15380,15281,15067,14846,14756,14568,14461,14298,14037,13772,13636,-49,-99,-214,-221,-90,-188,-107,-163,-261,-265,-136,43,181,170,143,159,158,180,154,141,137,136,81,217,203,227,175,231,217,219,200,195,182,-38,-36,-33,-84,-16,-73,-37,-65,-59,-58,-46,0,1,6,3,2,-2,-1,0,0,0,0,-11,-64,-189,-142,-75,-113,-69,-98,-203,-206,-90,-11,-63,-183,-139,-73,-115,-70,-98,-203,-206,-90,0,0,2,2,-1,0,0,0,1,-1,0,292,292,292,292,292,292,292,292,292,292,292,292,11.806529467,11.203374193,9.5610604085,10.742517397,10.77615605,12.401391712,10.709690879,9.9523557438,9.8529253119,9.924109749,14.154789472,13.37814683,15.177347641,11.823525437,15.755012959,14.950566675,15.230014952,14.116816658,14.024236758,13.280793929,-2.348260005,-2.174772637,-5.616287233,-1.08100804,-4.978856909,-2.549174963,-4.520324072,-4.164460914,-4.171311446,-3.35668418,0.0652294446,0.3954132068,0.2005816869,0.135126005,-0.136407039,-0.068896621,0,0,0,0,-4.174684453,-12.45551601,-9.494199846,-5.067225187,-7.706997681,-4.753866823,-6.815257832,-14.32856891,-14.81534755,-6.567425569,-4.109455008,-12.06010281,-9.293618159,-4.932099182,-7.84340472,-4.822763443,-6.815257832,-14.32856891,-14.81534755,-6.567425569 +050,2,3,17,129,Illinois,Menard County,12705,12705,12696,12700,12692,12576,12513,12364,12431,12311,12297,12198,12068,-9,4,-8,-116,-63,-149,67,-120,-14,-99,-130,40,133,112,114,132,97,141,132,110,116,104,42,116,118,138,135,125,122,131,140,119,148,-2,17,-6,-24,-3,-28,19,1,-30,-3,-44,0,-2,-3,-2,-2,-2,0,0,0,0,0,-7,-10,0,-90,-59,-119,48,-122,17,-95,-87,-7,-12,-3,-92,-61,-121,48,-122,17,-95,-87,0,-1,1,0,1,0,0,1,-1,-1,1,154,154,154,154,154,154,154,154,154,154,154,154,10.474090408,8.8216761185,9.0232705398,10.522539758,7.7983679704,11.373260738,10.670115593,8.9401820546,9.4713206777,8.5716640567,9.1352968971,9.2942659105,10.922906443,10.761688389,10.049443261,9.8406936882,10.589281384,11.378413524,9.7162686263,12.198137311,1.3387935108,-0.472589792,-1.899635903,-0.239148631,-2.25107529,1.5325670498,0.080834209,-2.438231469,-0.244947949,-3.626473255,-0.157505119,-0.236294896,-0.158302992,-0.159432421,-0.160791092,0,0,0,0,0,-0.787525595,0,-7.123634637,-4.703256407,-9.567069984,3.8717483364,-9.861773503,1.3816644993,-7.756685038,-7.170526663,-0.945030713,-0.236294896,-7.281937629,-4.862688828,-9.727861076,3.8717483364,-9.861773503,1.3816644993,-7.756685038,-7.170526663 +050,2,3,17,131,Illinois,Mercer County,16434,16436,16410,16320,16165,16077,15902,15748,15611,15618,15572,15490,15225,-26,-90,-155,-88,-175,-154,-137,7,-46,-82,-265,39,150,149,148,156,137,140,162,131,146,139,59,164,172,189,188,174,195,197,210,184,179,-20,-14,-23,-41,-32,-37,-55,-35,-79,-38,-40,0,5,3,3,5,4,4,4,4,4,2,-4,-81,-139,-51,-149,-121,-85,41,31,-48,-227,-4,-76,-136,-48,-144,-117,-81,45,35,-44,-225,-2,0,4,1,1,0,-1,-3,-2,0,0,185,185,185,185,185,185,185,185,185,185,185,185,9.1659028414,9.173464676,9.1805719248,9.7564026392,8.6571879937,8.9288561497,10.374971981,8.4001282462,9.4005537312,9.0509523034,10.021387107,10.589502847,11.723838472,11.757716001,10.995260664,12.436621066,12.616478273,13.465854441,11.847273196,11.655542894,-0.855484265,-1.416038171,-2.543266547,-2.001313362,-2.33807267,-3.507764916,-2.241506292,-5.065726194,-2.446719464,-2.604590591,0.3055300947,0.1847006311,0.1860926742,0.3127052128,0.252764613,0.2551101757,0.2561721477,0.2564924655,0.2575494173,0.1302295295,-4.949587534,-8.557795906,-3.163575461,-9.318615341,-7.646129542,-5.421091234,2.6257645138,1.9878166079,-3.090593008,-14.7810516,-4.64405744,-8.373095275,-2.977482786,-9.005910129,-7.393364929,-5.165981058,2.8819366614,2.2443090734,-2.83304359,-14.65082207 +050,2,3,17,133,Illinois,Monroe County,32957,33006,33051,33273,33320,33523,33608,33811,34037,34261,34446,34738,34739,45,222,47,203,85,203,226,224,185,292,1,84,306,319,335,318,357,400,320,347,379,383,49,266,267,298,266,319,279,283,308,318,348,35,40,52,37,52,38,121,37,39,61,35,-1,-3,-4,0,3,5,6,6,5,3,4,16,186,4,172,33,164,99,184,143,230,-38,15,183,0,172,36,169,105,190,148,233,-34,-5,-1,-5,-6,-3,-4,0,-3,-2,-2,0,343,343,343,343,343,343,343,343,343,343,343,343,9.227428985,9.5805865481,10.023487875,9.474013496,10.590486361,11.791062375,9.3706989956,10.100863085,10.956290472,11.025231372,8.0212291177,8.0188608412,8.9164160795,7.9248037419,9.4632077011,8.2242660064,8.2872119242,8.96560758,9.1928769658,10.017703701,1.2061998673,1.5617257069,1.1070717951,1.5492097541,1.1272786603,3.5667963684,1.0834870714,1.1352555053,1.763413506,1.007527671,-0.09046499,-0.120132747,0,0.0893774858,0.1483261395,0.1768659356,0.1757006062,0.1455455776,0.0867252544,0.1151460195,5.608829383,0.1201327467,5.1463878043,0.9831523439,4.8650973761,2.9182879377,5.3881519225,4.1626035193,6.6489361702,-1.093887186,5.518364393,0,5.1463878043,1.0725298297,5.0134235156,3.0951538734,5.5638525286,4.3081490969,6.7356614246,-0.978741166 +050,2,3,17,135,Illinois,Montgomery County,30104,30103,30095,29866,29620,29367,29450,29196,29057,28781,28705,28401,28045,-8,-229,-246,-253,83,-254,-139,-276,-76,-304,-356,73,299,311,301,277,281,299,319,304,299,287,65,365,333,355,353,356,369,370,341,378,391,8,-66,-22,-54,-76,-75,-70,-51,-37,-79,-104,0,5,0,2,1,1,0,0,0,0,0,-13,-167,-231,-207,155,-180,-67,-226,-38,-226,-252,-13,-162,-231,-205,156,-179,-67,-226,-38,-226,-252,-3,-1,7,6,3,0,-2,1,-1,1,0,2419,2419,2426,2312,2100,2480,2426,2450,2453,2454,2452,2451,9.9731492137,10.456241805,10.205638531,9.4190455141,9.5829212564,10.265565722,11.030810194,10.576488188,10.471754282,10.16901109,12.174580144,11.195911643,12.036550426,12.00333237,12.140640453,12.668875423,12.794356651,11.863758132,13.238538858,13.853948907,-2.20143093,-0.739669838,-1.830911896,-2.584286856,-2.557719197,-2.403309701,-1.763546457,-1.287269944,-2.766784576,-3.684937817,0.1667750705,0,0.0678115517,0.0340037744,0.0341029226,0,0,0,0,0,-5.570287353,-7.766533302,-7.018495601,5.2705850349,-6.138526072,-2.300310714,-7.81493136,-1.322061024,-7.915105243,-8.928887787,-5.403512283,-7.766533302,-6.950684049,5.3045888094,-6.104423149,-2.300310714,-7.81493136,-1.322061024,-7.915105243,-8.928887787 +050,2,3,17,137,Illinois,Morgan County,35547,35542,35499,35482,35318,35009,34684,34693,34654,34275,34052,33679,33400,-43,-17,-164,-309,-325,9,-39,-379,-223,-373,-279,78,372,378,391,350,388,347,385,367,312,318,87,380,411,421,372,391,393,413,421,371,386,-9,-8,-33,-30,-22,-3,-46,-28,-54,-59,-68,3,30,29,34,36,47,52,58,44,39,29,-35,-35,-158,-314,-339,-30,-43,-409,-215,-350,-241,-32,-5,-129,-280,-303,17,9,-351,-171,-311,-212,-2,-4,-2,1,0,-5,-2,0,2,-3,1,3064,3062,3036,3154,3067,2888,3015,3321,3324,3323,3328,3328,10.481678196,10.677966102,11.119484693,10.044050335,11.185263128,10.007642724,11.170914999,10.742459057,9.2129157993,9.481357802,10.70709063,11.610169492,11.972642086,10.675390642,11.271747121,11.334304296,11.983345181,12.32309336,10.9551018,11.508817961,-0.225412434,-0.93220339,-0.853157393,-0.631340307,-0.086483993,-1.326661572,-0.812430182,-1.580634303,-1.742186001,-2.027460159,0.8452966287,0.8192090395,0.9669117124,1.0331023202,1.3549158943,1.4997043852,1.6828910908,1.2879242466,1.1516144749,0.8646521266,-0.9861794,-4.463276836,-8.92971405,-9.728380182,-0.864839933,-1.240140165,-11.86728373,-6.293266205,-10.3350017,-7.185557328,-0.140882771,-3.644067797,-7.962802338,-8.695277861,0.4900759618,0.2595642205,-10.18439264,-5.005341959,-9.183387223,-6.320905201 +050,2,3,17,139,Illinois,Moultrie County,14846,14856,14863,14859,14876,14799,14754,14747,14610,14704,14662,14464,14347,7,-4,17,-77,-45,-7,-137,94,-42,-198,-117,49,168,183,177,200,194,187,187,194,155,160,65,214,177,175,182,210,190,170,193,162,152,-16,-46,6,2,18,-16,-3,17,1,-7,8,0,1,1,0,3,3,2,2,2,2,2,21,43,10,-78,-64,7,-136,75,-44,-194,-126,21,44,11,-78,-61,10,-134,77,-42,-192,-124,2,-2,0,-1,-2,-1,0,0,-1,1,-1,395,395,395,395,395,395,395,395,395,395,395,395,11.304757419,12.308727089,11.929233361,13.535004906,13.152096539,12.739721361,12.758408951,13.212558741,10.643411385,11.106868904,14.400107664,11.905162267,11.794439764,12.316854465,14.236805532,12.944101918,11.598553592,13.144452769,11.124081577,10.551525459,-3.095350246,0.4035648226,0.1347935973,1.2181504416,-1.084708993,-0.204380557,1.1598553592,0.0681059729,-0.480670192,0.5553434452,0.0672902227,0.0672608038,0,0.2030250736,0.2033829362,0.1362537044,0.1364535717,0.1362119458,0.1373343405,0.1388358613,2.8934795774,0.6726080377,-5.256950295,-4.33120157,0.4745601844,-9.265251899,5.1170089377,-2.996662807,-13.32143102,-8.746659262,2.9607698001,0.7398688414,-5.256950295,-4.128176496,0.6779431206,-9.128998195,5.2534625094,-2.860450862,-13.18409668,-8.607823401 +050,2,3,17,141,Illinois,Ogle County,53497,53494,53420,53073,52788,52278,51944,51572,51174,51021,50802,50660,50306,-74,-347,-285,-510,-334,-372,-398,-153,-219,-142,-354,135,546,521,538,546,519,546,533,504,540,526,138,471,474,482,514,519,486,521,546,494,520,-3,75,47,56,32,0,60,12,-42,46,6,3,8,12,6,30,32,24,19,14,17,14,-77,-431,-349,-587,-403,-405,-486,-181,-191,-203,-374,-74,-423,-337,-581,-373,-373,-462,-162,-177,-186,-360,3,1,5,15,7,1,4,-3,0,-2,0,525,525,525,525,525,525,525,525,526,526,525,526,10.254195111,9.8430961355,10.241181733,10.477634281,10.027435372,10.628150974,10.431038701,9.89953154,10.644379176,10.419349088,8.8456518269,8.9551392864,9.1751851217,9.8635604767,10.027435372,9.4602222958,10.196193552,10.724492502,9.7376357651,10.300497197,1.4085432845,0.8879568491,1.0659966117,0.614073804,0,1.1679286785,0.234845149,-0.824960962,0.9067434113,0.1188518907,0.150244617,0.226712387,0.1142139227,0.5756941912,0.6182619112,0.4671714714,0.3718381526,0.2749869872,0.3351008259,0.2773210784,-8.094428742,-6.593551922,-11.17392877,-7.733491969,-7.824877314,-9.460222296,-3.542247664,-3.751608183,-4.001498098,-7.408434523,-7.944184125,-6.366839535,-11.05971485,-7.157797778,-7.206615402,-8.993050824,-3.170409511,-3.476621196,-3.666397272,-7.131113444 +050,2,3,17,143,Illinois,Peoria County,186494,186496,186224,186775,187354,188688,187572,186552,185116,182657,180773,179359,177652,-272,551,579,1334,-1116,-1020,-1436,-2459,-1884,-1414,-1707,624,2575,2580,2780,2755,2705,2585,2504,2560,2465,2411,435,1812,1734,1820,1765,1872,1838,1839,1868,1803,1920,189,763,846,960,990,833,747,665,692,662,491,81,411,443,427,327,345,327,388,292,226,187,-563,-619,-681,-19,-2480,-2213,-2516,-3528,-2874,-2298,-2374,-482,-208,-238,408,-2153,-1868,-2189,-3140,-2582,-2072,-2187,21,-4,-29,-34,47,15,6,16,6,-4,-11,4979,4979,4975,4926,4881,4858,4835,4807,4808,4810,4810,4811,13.807007525,13.792034298,14.785582462,14.64412906,14.460446269,13.910263999,13.617095328,14.087994937,13.689424989,13.506586632,9.7158437422,9.2695300284,9.6797698129,9.3818104502,10.007377233,9.8905474779,10.000734149,10.279833806,10.012995235,10.755971105,4.0911637833,4.5225042699,5.1058126486,5.2623186095,4.4530690359,4.0197165212,3.6163611793,3.8081611314,3.6764297535,2.7506155273,2.2037592594,2.3681671295,2.2710229177,1.7381597831,1.8443083042,1.759634943,2.1099971994,1.6069119225,1.2550953539,1.047586769,-3.319043751,-3.640455565,-0.101052542,-13.18237389,-11.83030225,-13.53896488,-19.18574773,-15.81597557,-12.76198727,-13.29931011,-1.115284491,-1.272288435,2.1699703756,-11.44421411,-9.985993949,-11.77932994,-17.07575053,-14.20906364,-11.50689192,-12.25172334 +050,2,3,17,145,Illinois,Perry County,22350,22346,22316,22267,21849,21718,21543,21522,21407,21292,21163,20935,20664,-30,-49,-418,-131,-175,-21,-115,-115,-129,-228,-271,49,204,205,209,226,201,227,209,196,180,173,76,249,227,240,241,267,232,236,230,229,244,-27,-45,-22,-31,-15,-66,-5,-27,-34,-49,-71,3,24,19,17,4,4,8,10,9,8,6,-4,-27,-431,-115,-162,43,-118,-97,-106,-187,-205,-1,-3,-412,-98,-158,47,-110,-87,-97,-179,-199,-2,-1,16,-2,-2,-2,0,-1,2,0,-1,2500,2500,2556,2302,2402,2424,2526,2470,2474,2474,2471,2472,9.1514702914,9.2936802974,9.5944177933,10.448209704,9.3347265761,10.575601575,9.7894564276,9.2333058533,8.5514751295,8.3175076324,11.170176973,10.291050866,11.017513255,11.14167495,12.399860676,10.808544341,11.054123047,10.835001767,10.879376692,11.731051227,-2.018706682,-0.997370569,-1.423095462,-0.693465246,-3.0651341,-0.232942766,-1.26466662,-1.601695913,-2.327901563,-3.413543595,1.0766435637,0.861365491,0.7804071889,0.1849240656,0.185765703,0.3727084255,0.4683950444,0.42397833,0.3800655613,0.2884684728,-1.211224009,-19.53939614,-5.279225102,-7.489424655,1.9969813073,-5.497449277,-4.54343193,-4.993522553,-8.884032496,-9.856006154,-0.134580445,-18.67803065,-4.498817913,-7.304500589,2.1827470103,-5.124740851,-4.075036886,-4.569544223,-8.503966934,-9.567537681 +050,2,3,17,147,Illinois,Piatt County,16729,16727,16710,16683,16505,16437,16414,16356,16511,16427,16375,16391,16355,-17,-27,-178,-68,-23,-58,155,-84,-52,16,-36,47,154,177,161,182,190,163,181,181,184,180,54,148,178,193,167,181,156,173,162,164,189,-7,6,-1,-32,15,9,7,8,19,20,-9,1,4,3,2,3,0,0,-1,-1,-1,-1,-9,-38,-182,-38,-39,-67,150,-93,-69,-4,-25,-8,-34,-179,-36,-36,-67,150,-94,-70,-5,-26,-2,1,2,0,-2,0,-2,2,-1,1,-1,72,72,72,72,72,72,72,72,72,72,72,72,9.223489953,10.666505966,9.7747556311,11.08033241,11.595971926,9.9187635014,10.990345498,11.035912444,11.231154245,10.993709155,8.8641332016,10.726768712,11.717564204,10.1671182,11.046689045,9.4928043326,10.504584371,9.8774464972,10.01037661,11.543394613,0.3593567514,-0.060262746,-1.942808573,0.9132142096,0.5492828807,0.4259591688,0.485761127,1.1584659472,1.2207776354,-0.549685458,0.2395711676,0.1807882367,0.1214255358,0.1826428419,0,0,-0.060720141,-0.060971892,-0.061038882,-0.061076162,-2.275926092,-10.96781969,-2.30708518,-2.374356945,-4.08910589,9.1276964737,-5.646973101,-4.207060545,-0.244155527,-1.526904049,-2.036354925,-10.78703146,-2.185659644,-2.191714103,-4.08910589,9.1276964737,-5.707693242,-4.268032437,-0.305194409,-1.587980211 +050,2,3,17,149,Illinois,Pike County,16430,16432,16395,16348,16233,16069,15953,15794,15757,15669,15614,15574,15239,-37,-47,-115,-164,-116,-159,-37,-88,-55,-40,-335,34,189,165,169,178,177,203,187,203,199,203,56,215,202,185,204,199,212,217,197,191,187,-22,-26,-37,-16,-26,-22,-9,-30,6,8,16,0,1,0,0,0,-1,0,1,1,1,0,-14,-21,-77,-149,-87,-139,-27,-56,-62,-48,-349,-14,-20,-77,-149,-87,-140,-27,-55,-61,-47,-349,-1,-1,-1,1,-3,3,-1,-3,0,-1,-2,627,627,627,627,627,627,506,488,487,488,488,488,11.544452249,10.12860256,10.463748375,11.117356817,11.150659905,12.868054895,11.900973716,12.978294921,12.761318456,13.176256775,13.132577956,12.399864952,11.454399108,12.741240397,12.536617633,13.438559792,13.810220836,12.594699997,12.248300628,12.137734073,-1.588125706,-2.271262392,-0.990650734,-1.62388358,-1.385957728,-0.570504897,-1.90924712,0.3835949238,0.5130178274,1.0385227015,0.0610817579,0,0,0,-0.062998079,0,0.0636415707,0.0639324873,0.0641272284,0,-1.282716917,-4.726681195,-9.225434958,-5.433764287,-8.75673292,-1.711514691,-3.563927958,-3.963814212,-3.078106964,-22.65277643,-1.221635159,-4.726681195,-9.225434958,-5.433764287,-8.819730998,-1.711514691,-3.500286387,-3.899881725,-3.013979736,-22.65277643 +050,2,3,17,151,Illinois,Pope County,4470,4478,4477,4502,4464,4462,4382,4302,4189,4193,4183,4176,4142,-1,25,-38,-2,-80,-80,-113,4,-10,-7,-34,3,33,33,29,31,32,23,25,28,29,27,5,58,59,54,45,44,55,50,60,37,35,-2,-25,-26,-25,-14,-12,-32,-25,-32,-8,-8,0,2,3,1,0,0,0,1,0,0,0,2,47,-15,23,-68,-69,-81,29,22,2,-27,2,49,-12,24,-68,-69,-81,30,22,2,-27,-1,1,0,-1,2,1,0,-1,0,-1,1,389,386,428,431,408,371,310,272,272,272,272,272,7.3504844637,7.3611420923,6.497871387,7.0104025328,7.3698756333,5.4175008833,5.9651634455,6.6857688634,6.9386290226,6.4919451791,12.9190333,13.160829801,12.099484652,10.176390773,10.133578996,12.954893417,11.930326891,14.326647564,8.8527335806,8.4154844915,-5.568548836,-5.799687709,-5.601613265,-3.165988241,-2.763703363,-7.537392533,-5.965163445,-7.640878701,-1.914104558,-1.923539312,0.4454839069,0.6691947357,0.2240645306,0,0,0,0.2386065378,0,0,0,10.468871812,-3.345973678,5.1534842035,-15.37765717,-15.89129433,-19.07902485,6.9195895968,5.253104107,0.4785261395,-6.491945179,10.914355719,-2.676778943,5.377548734,-15.37765717,-15.89129433,-19.07902485,7.1581961346,5.253104107,0.4785261395,-6.491945179 +050,2,3,17,153,Illinois,Pulaski County,6161,6165,6131,5990,5965,5897,5802,5662,5604,5531,5426,5309,5201,-34,-141,-25,-68,-95,-140,-58,-73,-105,-117,-108,14,56,71,56,64,63,62,89,57,43,42,39,71,90,88,72,96,85,79,65,59,67,-25,-15,-19,-32,-8,-33,-23,10,-8,-16,-25,0,2,2,3,3,2,4,6,5,3,2,-8,-129,-7,-40,-92,-110,-38,-90,-103,-103,-84,-8,-127,-5,-37,-89,-108,-34,-84,-98,-100,-82,-1,1,-1,1,2,1,-1,1,1,-1,-1,21,21,21,21,21,21,21,21,21,21,21,21,9.2401617028,11.877875366,9.44191536,10.941106077,10.990928123,11.006568436,15.985630894,10.404307748,8.0111783884,7.9923882017,11.715205016,15.056461731,14.837295566,12.308744337,16.748080949,15.089650275,14.189492591,11.864561468,10.992081975,12.749762131,-2.475043313,-3.178586366,-5.395380206,-1.36763826,-5.757152826,-4.083081839,1.7961383026,-1.460253719,-2.980903586,-4.75737393,0.3300057751,0.3345880385,0.5058168943,0.5128643474,0.3489183531,0.7101011894,1.0776829816,0.9126585744,0.5589194224,0.3805899144,-21.28537249,-1.171058135,-6.744225257,-15.72783999,-19.19050942,-6.745961299,-16.16524472,-18.80076663,-19.18956684,-15.9847764,-20.95536672,-0.836470096,-6.238408363,-15.21497564,-18.84159107,-6.03586011,-15.08756174,-17.88810806,-18.63064741,-15.60418649 +050,2,3,17,155,Illinois,Putnam County,6006,6008,6014,5978,5911,5854,5831,5729,5702,5696,5740,5745,5716,6,-36,-67,-57,-23,-102,-27,-6,44,5,-29,13,49,55,51,41,64,40,53,52,39,37,5,53,55,59,52,61,60,71,51,54,65,8,-4,0,-8,-11,3,-20,-18,1,-15,-28,1,1,2,2,2,1,0,0,-1,-1,1,-2,-33,-69,-53,-12,-107,-6,12,44,22,-3,-1,-32,-67,-51,-10,-106,-6,12,43,21,-2,-1,0,0,2,-2,1,-1,0,0,-1,1,2,2,2,2,2,2,2,2,2,2,2,2,8.1721147432,9.252249979,8.6697832554,7.0175438596,11.07266436,6.998512816,9.2998771714,9.0940888423,6.791467131,6.4566791728,8.8392261508,9.252249979,10.029749256,8.9002995293,10.553633218,10.497769224,12.458326022,8.9192025184,9.4035698737,11.342814763,-0.667111408,0,-1.359966001,-1.88275567,0.5190311419,-3.499256408,-3.158448851,0.1748863239,-2.612102743,-4.88613559,0.1667778519,0.3364454538,0.3399915002,0.3423192127,0.1730103806,0,0,-0.174886324,-0.174140183,0.1745048425,-5.503669113,-11.60736816,-9.009774756,-2.053915276,-18.51211073,-1.049776922,2.1056325671,7.6949982511,3.8310840226,-0.523514528,-5.336891261,-11.2709227,-8.669783255,-1.711596063,-18.33910035,-1.049776922,2.1056325671,7.5201119272,3.6569438398,-0.349009685 +050,2,3,17,157,Illinois,Randolph County,33476,33427,33410,33375,33023,33123,33088,32754,32368,32258,32161,31725,31351,-17,-35,-352,100,-35,-334,-386,-110,-97,-436,-374,82,345,343,373,344,310,329,370,329,293,292,56,358,381,381,334,401,383,390,358,398,422,26,-13,-38,-8,10,-91,-54,-20,-29,-105,-130,0,9,6,-1,5,9,18,20,17,14,12,-42,-30,-326,112,-46,-253,-352,-108,-85,-343,-256,-42,-21,-320,111,-41,-244,-334,-88,-68,-329,-244,-1,-1,6,-3,-4,1,2,-2,0,-2,0,4298,4298,4367,4339,4498,4525,4494,4307,4309,4313,4313,4313,10.331661301,10.331636495,11.278081819,10.39102264,9.4164818809,10.104112282,11.450499799,10.214377746,9.1725886736,9.2586720781,10.720970278,11.476249285,11.519970973,10.088958028,12.180674949,11.762538006,12.069445734,11.114733231,12.45969383,13.38068362,-0.389308977,-1.14461279,-0.241889154,0.3020646116,-2.764193068,-1.658425724,-0.618945935,-0.900355485,-3.287105156,-4.122011542,0.2695215992,0.1807283352,-0.030236144,0.1510323058,0.273381732,0.5528085747,0.6189459351,0.5277945948,0.4382806875,0.3804933731,-0.898405331,-9.819572879,3.3864481601,-1.389497213,-7.685064245,-10.81047879,-3.342308049,-2.638972974,-10.73787684,-8.117191959,-0.628883731,-9.638844544,3.3562120158,-1.238464908,-7.411682513,-10.25767022,-2.723362114,-2.111178379,-10.29959616,-7.736698586 +050,2,3,17,159,Illinois,Richland County,16233,16233,16193,16189,16132,16008,16019,15952,15819,15842,15700,15519,15507,-40,-4,-57,-124,11,-67,-133,23,-142,-181,-12,49,212,190,189,195,203,192,187,184,167,165,76,180,175,207,209,218,224,200,221,193,196,-27,32,15,-18,-14,-15,-32,-13,-37,-26,-31,0,5,3,0,6,4,7,9,7,5,1,-13,-40,-75,-106,22,-54,-109,28,-111,-160,19,-13,-35,-72,-106,28,-50,-102,37,-104,-155,20,0,-1,0,0,-3,-2,1,-1,-1,0,-1,364,364,364,364,364,364,364,364,364,364,364,364,13.093694028,11.757061972,11.761045426,12.177225466,12.699008476,12.086493972,11.812640157,11.666983704,10.698613024,10.636240572,11.117287382,10.828872869,12.881144991,13.051487807,13.637358856,14.100909635,12.63383974,14.013061949,12.364265351,12.634564559,1.9764066457,0.9281891031,-1.120099564,-0.874262341,-0.93835038,-2.014415662,-0.821199583,-2.346078245,-1.665652327,-1.998323986,0.3088135384,0.1856378206,0,0.3746838605,0.250226768,0.4406534261,0.5685227883,0.4438526409,0.3203177552,0.0644620641,-2.470508307,-4.640945515,-6.596141879,1.3738408218,-3.378061368,-6.861603349,1.7687375636,-7.038234735,-10.25016817,1.2247792174,-2.161694769,-4.455307695,-6.596141879,1.7485246823,-3.1278346,-6.420949923,2.3372603519,-6.594382094,-9.929850412,1.2892412815 +050,2,3,17,161,Illinois,Rock Island County,147546,147542,147613,147474,147699,147686,147090,146161,144977,143824,142522,141775,140907,71,-139,225,-13,-596,-929,-1184,-1153,-1302,-747,-868,479,1873,1899,1779,1891,1883,1865,1789,1635,1724,1686,298,1548,1569,1574,1509,1600,1572,1644,1650,1501,1536,181,325,330,205,382,283,293,145,-15,223,150,62,349,405,479,490,390,315,364,299,218,181,-163,-812,-489,-686,-1478,-1611,-1792,-1666,-1588,-1188,-1199,-101,-463,-84,-207,-988,-1221,-1477,-1302,-1289,-970,-1018,-9,-1,-21,-11,10,9,0,4,2,0,0,4313,4313,4345,4493,4635,4623,4576,4579,4582,4585,4589,4586,12.694561265,12.867030521,12.045296816,12.830081146,12.842240947,12.81179372,12.389153777,11.419750931,12.128161746,11.928598213,10.491821056,10.631053653,10.65727779,10.238282628,10.912153752,10.799002535,11.385002129,11.524519288,10.559379804,10.867335027,2.2027402088,2.2359768678,1.388019026,2.5917985182,1.9300871949,2.0127911849,1.0041516477,-0.104768357,1.5687819428,1.0612631862,2.3654041012,2.7441534287,3.2432249437,3.3245583087,2.6598374771,2.1639222637,2.5207668949,2.0883825861,1.5336074598,1.2805909113,-5.503461691,-3.313311177,-4.644785619,-10.02795343,-10.98717481,-12.31031332,-11.53735617,-11.09147674,-8.357457166,-8.483030402,-3.13805759,-0.569157748,-1.401560675,-6.70339512,-8.327337332,-10.14639106,-9.016589278,-9.003094159,-6.823849706,-7.20243949 +050,2,3,17,163,Illinois,St. Clair County,270056,270075,270368,270097,268748,266934,266061,265008,263482,262881,261631,259889,258046,293,-271,-1349,-1814,-873,-1053,-1526,-601,-1250,-1742,-1843,836,3552,3401,3367,3390,3430,3416,3174,3261,2984,2985,513,2443,2465,2509,2539,2470,2550,2589,2685,2709,2926,323,1109,936,858,851,960,866,585,576,275,59,91,97,354,185,209,300,213,183,83,104,82,-104,-1477,-2691,-2904,-1946,-2320,-2614,-1371,-1913,-2128,-1984,-13,-1380,-2337,-2719,-1737,-2020,-2401,-1188,-1830,-2024,-1902,-17,0,52,47,13,7,9,2,4,7,0,4451,4451,4484,4642,4634,4905,5166,4552,4551,4554,4558,4561,13.144236907,12.623296124,12.570890939,12.720569611,12.917342191,12.927396923,12.060118207,12.434415228,11.443472925,11.526542906,9.0403633908,9.1491987492,9.3674978812,9.5272938771,9.3019927731,9.6501352911,9.8373175926,10.238087975,10.388863323,11.29871509,4.1038735163,3.4740973749,3.2033930578,3.1932757343,3.6153494179,3.2772616322,2.2228006148,2.1963272528,1.0546096027,0.2278278162,0.3589501633,1.3139214431,0.6907082934,0.784247507,1.1297966931,0.8060701243,0.6953376282,0.3164846562,0.398834177,0.3166420497,-5.465663827,-9.988029953,-10.84225343,-7.30213229,-8.737094427,-9.892334765,-5.209332723,-7.294399366,-8.160760853,-7.661193007,-5.106713663,-8.67410851,-10.15154513,-6.517884783,-7.607297733,-9.086264641,-4.513995095,-6.977914709,-7.761926676,-7.344550957 +050,2,3,17,165,Illinois,Saline County,24913,24913,24900,24904,24913,24801,24496,24495,24217,23968,23769,23540,23182,-13,4,9,-112,-305,-1,-278,-249,-199,-229,-358,70,311,319,309,310,368,321,299,286,288,270,117,357,327,353,369,358,371,391,396,313,343,-47,-46,-8,-44,-59,10,-50,-92,-110,-25,-73,2,7,6,3,3,1,0,0,0,0,0,32,44,18,-69,-252,-9,-229,-156,-88,-203,-284,34,51,24,-66,-249,-8,-229,-156,-88,-203,-284,0,-1,-7,-2,3,-3,1,-1,-1,-1,-1,878,878,879,882,882,882,882,881,881,883,883,883,12.48895671,12.806873156,12.431105926,12.576830233,15.023167521,13.179504024,12.410501193,11.982319794,12.175273204,11.557724412,14.336197896,13.128048658,14.201231042,14.970485019,14.614929273,15.23238627,16.229116945,16.59090433,13.232154558,14.682590643,-1.847241185,-0.321175502,-1.770125116,-2.393654786,0.4082382478,-2.052882247,-3.818615752,-4.608584536,-1.056881354,-3.12486623,0.2811019195,0.2408816268,0.1206903488,0.1217112603,0.0408238248,0,0,0,0,0,1.7669263513,0.7226448803,-2.775878022,-10.22374587,-0.367414423,-9.40220069,-6.475044101,-3.686867629,-8.581876599,-12.15701383,2.0480282708,0.963526507,-2.655187673,-10.10203461,-0.326590598,-9.40220069,-6.475044101,-3.686867629,-8.581876599,-12.15701383 +050,2,3,17,167,Illinois,Sangamon County,197465,197463,197769,199052,199431,199190,199252,198973,198085,197163,195802,194882,193882,306,1283,379,-241,62,-279,-888,-922,-1361,-920,-1000,626,2404,2342,2284,2262,2335,2261,2273,2262,2226,2166,497,1800,1850,1835,1841,1977,1943,1968,2106,2075,2315,129,604,492,449,421,358,318,305,156,151,-149,31,247,262,282,279,284,239,291,215,163,139,162,439,-335,-969,-622,-909,-1447,-1521,-1739,-1239,-992,193,686,-73,-687,-343,-625,-1208,-1230,-1524,-1076,-853,-16,-7,-40,-3,-16,-12,2,3,7,5,2,3966,3966,3980,3978,3909,3965,4010,4012,4016,4017,4016,4017,12.116294249,11.754579242,11.459506649,11.354224705,11.727038734,11.388764362,11.501639477,11.512475666,11.395398839,11.143007069,9.0721005189,9.2852141748,9.206740237,9.2409936703,9.9290602047,9.7869832619,9.9583046594,10.718511827,10.622395593,11.909538949,3.0441937297,2.469365067,2.2527664122,2.1132310349,1.7979785297,1.6017811,1.5433348176,0.793963839,0.7730032456,-0.766531881,1.2448937934,1.3149870885,1.4148777912,1.4004547713,1.4263293364,1.2038543487,1.4724932194,1.0942450345,0.8344339671,0.7150867879,2.2125845154,-1.681376621,-4.861760921,-3.122160816,-4.565258334,-7.28860771,-7.696433632,-8.850661,-6.342721995,-5.103353191,3.4574783089,-0.366389532,-3.44688313,-1.721706045,-3.138928997,-6.084753361,-6.223940412,-7.756415966,-5.508288028,-4.388266403 +050,2,3,17,169,Illinois,Schuyler County,7544,7543,7534,7463,7456,7393,7262,7150,7040,6984,6896,6829,6738,-9,-71,-7,-63,-131,-112,-110,-56,-88,-67,-91,19,63,76,59,55,68,58,49,63,65,61,29,91,81,83,76,85,87,110,102,88,77,-10,-28,-5,-24,-21,-17,-29,-61,-39,-23,-16,3,-1,0,13,4,6,20,29,25,21,16,-1,-41,-1,-54,-117,-103,-101,-23,-73,-65,-90,2,-42,-1,-41,-113,-97,-81,6,-48,-44,-74,-1,-1,-1,2,3,2,0,-1,-1,0,-1,463,463,463,463,463,463,463,463,463,463,463,463,8.4016803361,10.188350426,7.946663075,7.5059706585,9.4365806273,8.1747709655,6.9880205362,9.0778097983,9.4717668488,8.9924080489,12.135760485,10.858636638,11.179203987,10.371886728,11.795725784,12.262156448,15.687393041,14.69740634,12.823315118,11.351072455,-3.734080149,-0.670286212,-3.232540912,-2.86591607,-2.359145157,-4.087385483,-8.699372504,-5.619596542,-3.35154827,-2.358664406,-0.133360005,0,1.7509596606,0.5458887752,0.8326394671,2.8188865398,4.1357672561,3.6023054755,3.0601092896,2.3586644063,-5.467760219,-0.134057242,-7.273217052,-15.96724667,-14.29364419,-14.23537703,-3.280091272,-10.51873199,-9.471766849,-13.26748729,-5.601120224,-0.134057242,-5.522257391,-15.4213579,-13.46100472,-11.41649049,0.855675984,-6.916426513,-6.411657559,-10.90882288 +050,2,3,17,171,Illinois,Scott County,5355,5358,5330,5232,5290,5212,5171,5112,5053,4983,4952,4974,4950,-28,-98,58,-78,-41,-59,-59,-70,-31,22,-24,8,50,53,41,46,54,52,48,50,30,41,26,64,55,67,55,66,52,62,52,51,53,-18,-14,-2,-26,-9,-12,0,-14,-2,-21,-12,0,0,0,0,1,0,6,7,6,6,5,-9,-85,58,-51,-34,-47,-65,-63,-35,37,-16,-9,-85,58,-51,-33,-47,-59,-56,-29,43,-11,-1,1,2,-1,1,0,0,0,0,0,-1,43,43,43,43,43,43,43,43,43,43,43,43,9.4679038061,10.074130393,7.8080365645,8.8606375807,10.502771565,10.23118544,9.5655639697,10.065425264,6.0447310095,8.2627972592,12.118916872,10.454286257,12.759474386,10.594240586,12.836720801,10.23118544,12.355520128,10.468042275,10.276042716,10.681176945,-2.651013066,-0.380155864,-4.951437821,-1.733603005,-2.333949237,0,-2.789956158,-0.402617011,-4.231311707,-2.418379686,0,0,0,0.1926225561,0,1.180521397,1.3949780789,1.2078510317,1.2089462019,1.0076582023,-16.09543647,11.024520053,-9.712435727,-6.549166907,-9.141301177,-12.7889818,-12.55480271,-7.045797685,7.455168245,-3.224506247,-16.09543647,11.024520053,-9.712435727,-6.356544351,-9.141301177,-11.6084604,-11.15982463,-5.837946653,8.6641144469,-2.216848045 +050,2,3,17,173,Illinois,Shelby County,22363,22355,22354,22280,22204,22139,22102,21819,21734,21773,21685,21625,21299,-1,-74,-76,-65,-37,-283,-85,39,-88,-60,-326,64,226,229,244,261,250,254,254,213,241,235,47,226,221,234,227,267,241,216,267,237,276,17,0,8,10,34,-17,13,38,-54,4,-41,1,8,6,7,2,1,0,0,0,-1,0,-19,-81,-89,-82,-68,-267,-96,3,-33,-63,-284,-18,-73,-83,-75,-66,-266,-96,3,-33,-64,-284,0,-1,-1,0,-5,0,-2,-2,-1,0,-1,205,205,205,205,205,205,205,205,205,205,205,205,10.126809159,10.295836705,11.005119185,11.799009968,11.384075955,11.663949671,11.676281978,9.8025679967,11.129069499,10.949585314,10.126809159,9.9361568204,10.55408971,10.261974187,12.158193119,11.066975868,9.9294366424,12.28772608,10.944354653,12.859938496,0,0.3596798849,0.4510294748,1.5370357813,-0.774117165,0.596973802,1.7468453352,-2.485158084,0.1847148465,-1.910353182,0.3584711207,0.2697599137,0.3157206323,0.0904138695,0.0455363038,0,0,0,-0.046178712,0,-3.629520097,-4.00143872,-3.698441693,-3.074071563,-12.15819312,-4.408421923,0.1379088423,-1.518707718,-2.909258832,-13.23269034,-3.271048976,-3.731678806,-3.382721061,-2.983657693,-12.11265682,-4.408421923,0.1379088423,-1.518707718,-2.955437543,-13.23269034 +050,2,3,17,175,Illinois,Stark County,5994,5992,5970,5843,5742,5708,5602,5508,5523,5459,5407,5312,5262,-22,-127,-101,-34,-106,-94,15,-64,-52,-95,-50,17,60,65,57,72,59,74,57,60,49,51,18,76,85,84,71,89,91,70,75,78,68,-1,-16,-20,-27,1,-30,-17,-13,-15,-29,-17,0,1,1,0,0,2,2,1,0,1,1,-22,-114,-83,-6,-109,-67,31,-52,-38,-66,-34,-22,-113,-82,-6,-109,-65,33,-51,-38,-65,-33,1,2,1,-1,2,1,-1,0,1,-1,0,92,92,92,92,92,92,92,92,92,92,92,92,10.158300178,11.221406992,9.9563318777,12.732095491,10.621062106,13.416734657,10.380622837,11.043622308,9.1426439033,9.6463022508,12.867180225,14.674147605,14.672489083,12.555260831,16.02160216,16.498957483,12.748133309,13.804527885,14.553596418,12.861736334,-2.708880047,-3.452740613,-4.716157205,0.1768346596,-5.400540054,-3.082222827,-2.367510472,-2.760905577,-5.410952514,-3.215434084,0.169305003,0.1726370306,0,0,0.3600360036,0.3626144502,0.1821161901,0,0.1865845695,0.1891431814,-19.30077034,-14.32887354,-1.048034934,-19.2749779,-12.06120612,5.6205239779,-9.470041887,-6.994294128,-12.31458158,-6.430868167,-19.13146533,-14.15623651,-1.048034934,-19.2749779,-11.70117012,5.9831384281,-9.287925697,-6.994294128,-12.12799701,-6.241724986 +050,2,3,17,177,Illinois,Stephenson County,47711,47704,47606,47328,46895,46683,46280,45680,45512,44998,44702,44371,43831,-98,-278,-433,-212,-403,-600,-168,-514,-296,-331,-540,119,486,520,482,484,526,493,472,491,490,471,163,523,519,536,517,541,539,550,597,532,597,-44,-37,1,-54,-33,-15,-46,-78,-106,-42,-126,3,12,11,32,29,22,23,25,19,16,17,-55,-252,-451,-191,-405,-612,-144,-461,-208,-304,-430,-52,-240,-440,-159,-376,-590,-121,-436,-189,-288,-413,-2,-1,6,1,6,5,-1,0,-1,-1,-1,835,835,835,835,835,835,835,835,836,836,836,836,10.238692144,11.037644736,10.301566608,10.412744855,11.439756416,10.812351961,10.429786764,10.947603122,11.002211669,10.680029931,11.018181052,11.016418497,11.455684028,11.122704732,11.765985211,11.821212387,12.153353221,13.311036789,11.945258384,13.537108002,-0.779488908,0.0212262399,-1.154117421,-0.709959877,-0.326228795,-1.008860426,-1.723566457,-2.363433668,-0.943046714,-2.857078071,0.2528072134,0.2334886387,0.6839214345,0.6239041339,0.4784688995,0.5044302132,0.5524251464,0.4236343367,0.3592558912,0.3854787873,-5.308951482,-9.573034185,-4.082156062,-8.713143939,-13.31013484,-3.158171769,-10.1867197,-4.637681159,-6.825861933,-9.750345797,-5.056144269,-9.339545546,-3.398234628,-8.089239805,-12.83166594,-2.653741556,-9.634294553,-4.214046823,-6.466606042,-9.36486701 +050,2,3,17,179,Illinois,Tazewell County,135394,135392,135487,135863,136149,136297,135392,134350,134004,133525,132465,131848,130777,95,376,286,148,-905,-1042,-346,-479,-1060,-617,-1071,400,1655,1602,1629,1626,1551,1562,1446,1390,1398,1339,298,1391,1365,1381,1372,1456,1393,1450,1430,1440,1556,102,264,237,248,254,95,169,-4,-40,-42,-217,5,36,28,46,57,82,70,85,63,48,33,3,84,47,-129,-1233,-1225,-581,-559,-1085,-626,-889,8,120,75,-83,-1176,-1143,-511,-474,-1022,-578,-856,-15,-8,-26,-17,17,6,-4,-1,2,3,2,2843,2843,2843,2843,2740,2738,2613,2561,2561,2565,2566,2565,12.19826792,11.778892108,11.958333027,11.969568146,11.499877661,11.641339425,10.810043023,10.451520734,10.578367315,10.197049024,10.252441496,10.036321927,10.137788773,10.099783208,10.795500886,10.381809103,10.839946324,10.75228392,10.896172341,11.849595431,1.9458264234,1.7425701807,1.8205442546,1.8697849379,0.7043767748,1.2595303219,-0.0299033,-0.300763187,-0.317805027,-1.652546406,0.2653399668,0.2058732703,0.3376815956,0.4195974073,0.6079883741,0.5216989499,0.6354451293,0.4737020189,0.3632057447,0.2513089005,0.6191265893,0.3455729894,-0.946976649,-9.076554443,-9.082753149,-4.330101284,-4.178986203,-8.158201436,-4.736808254,-6.770109472,0.8844665561,0.5514462597,-0.609295053,-8.656957035,-8.474764775,-3.808402334,-3.543541074,-7.684499417,-4.373602509,-6.518800571 +050,2,3,17,181,Illinois,Union County,17808,17804,17729,17690,17609,17541,17404,17285,17120,16982,16853,16693,16498,-75,-39,-81,-68,-137,-119,-165,-138,-129,-160,-195,33,182,184,188,187,196,200,175,178,177,178,73,192,238,235,238,235,197,237,224,221,239,-40,-10,-54,-47,-51,-39,3,-62,-46,-44,-61,0,6,8,4,7,3,4,7,6,5,3,-35,-34,-32,-23,-93,-81,-172,-82,-90,-121,-136,-35,-28,-24,-19,-86,-78,-168,-75,-84,-116,-133,0,-1,-3,-2,0,-2,0,-1,1,0,-1,566,566,566,574,583,580,577,566,566,566,565,565,10.276969988,10.425224511,10.697012802,10.702532551,11.300412234,11.62621712,10.263327664,10.52164918,10.55267394,10.725799162,10.841638669,13.484801269,13.371266003,13.621405065,13.548963648,11.451823863,13.899478036,13.240727058,13.175937519,14.401494381,-0.564668681,-3.059576759,-2.674253201,-2.918872514,-2.248551414,0.1743932568,-3.636150372,-2.719077878,-2.623263578,-3.675695219,0.3388012084,0.4532706309,0.2275960171,0.4006295607,0.1729654934,0.2325243424,0.4105331066,0.3546623319,0.2980981339,0.180771896,-1.919873514,-1.813082524,-1.308677098,-5.322649878,-4.670068321,-9.998546723,-4.809102105,-5.319934979,-7.213974841,-8.194992618,-1.581072306,-1.359811893,-1.081081081,-4.922020318,-4.497102828,-9.76602238,-4.398568999,-4.965272647,-6.915876707,-8.014220722 +050,2,3,17,183,Illinois,Vermilion County,81625,81625,81642,81427,80881,80608,79811,79209,78503,77722,76703,75736,74855,17,-215,-546,-273,-797,-602,-706,-781,-1019,-967,-881,274,1089,1074,1069,1023,1017,1016,986,987,918,880,163,1028,932,963,969,1034,971,988,1004,911,981,111,61,142,106,54,-17,45,-2,-17,7,-101,7,31,20,23,36,41,25,25,16,16,13,-97,-307,-717,-397,-899,-625,-777,-803,-1019,-988,-790,-90,-276,-697,-374,-863,-584,-752,-778,-1003,-972,-777,-4,0,9,-5,12,-1,1,-1,1,-2,-3,2903,2903,2903,2932,2985,2903,2902,2900,2902,2905,2907,2906,13.356309292,13.234098134,13.23929184,12.7541002,12.790843919,12.884244699,12.622819651,12.782904322,12.044161927,11.687285429,12.608159736,11.484338418,11.926508926,12.080863239,13.004653503,12.313584255,12.648423748,13.003075927,11.952321912,13.028667052,0.7481495563,1.7497597161,1.312782914,0.6732369607,-0.213809584,0.5706604444,-0.025604097,-0.220171604,0.0918400147,-1.341381623,0.3802071516,0.2464450304,0.2848491229,0.4488246405,0.5156584077,0.3170335802,0.3200512082,0.2072203335,0.2099200336,0.1726530802,-3.765277275,-8.835054341,-4.916743555,-11.20814866,-7.86064646,-9.853403673,-10.28004481,-13.19734499,-12.96256207,-10.49199487,-3.385070124,-8.588609311,-4.631894432,-10.75932402,-7.344988052,-9.536370092,-9.959993599,-12.99012466,-12.75264204,-10.31934179 +050,2,3,17,185,Illinois,Wabash County,11947,11947,11916,11796,11690,11675,11604,11627,11518,11466,11407,11370,11190,-31,-120,-106,-15,-71,23,-109,-52,-59,-37,-180,17,147,147,140,132,139,152,136,133,145,135,23,167,147,147,139,135,138,139,120,118,134,-6,-20,0,-7,-7,4,14,-3,13,27,1,0,20,23,30,33,33,5,7,5,3,2,-24,-120,-131,-38,-99,-12,-129,-55,-76,-66,-182,-24,-100,-108,-8,-66,21,-124,-48,-71,-63,-180,-1,0,2,0,2,-2,1,-1,-1,-1,-1,88,88,88,88,88,88,88,88,88,88,88,88,12.398785425,12.518095887,11.983736358,11.340693329,11.966768542,13.134586304,11.834319527,11.629432081,12.732142073,11.968085106,14.085695007,12.518095887,12.582923176,11.942093733,11.622401102,11.924821776,12.095370693,10.492720675,10.361329411,11.879432624,-1.686909582,0,-0.599186818,-0.601400404,0.3443674401,1.209764528,-0.261051166,1.1367114065,2.3708126619,0.0886524823,1.6869095816,1.9586136422,2.5679435052,2.8351733322,2.8410313805,0.43205876,0.6091193874,0.4371966948,0.2634236291,0.1773049645,-10.12145749,-11.15558205,-3.25272844,-8.505519997,-1.03310232,-11.14711601,-4.785938044,-6.645389761,-5.79531984,-16.13475177,-8.434547908,-9.196968407,-0.684784935,-5.670346664,1.8079290603,-10.71505725,-4.176818656,-6.208193066,-5.531896211,-15.95744681 +050,2,3,17,187,Illinois,Warren County,17707,17701,17710,17831,17742,17660,17705,17448,17283,17133,16979,16816,16696,9,121,-89,-82,45,-257,-165,-150,-154,-163,-120,54,191,223,215,217,214,234,205,209,203,196,30,180,192,181,188,190,189,165,197,184,189,24,11,31,34,29,24,45,40,12,19,7,3,29,48,46,46,47,34,43,29,24,19,-16,80,-168,-168,-25,-331,-245,-233,-196,-205,-146,-13,109,-120,-122,21,-284,-211,-190,-167,-181,-127,-2,1,0,6,-5,3,1,0,1,-1,0,1116,1116,1116,1053,1010,1033,1053,973,976,977,978,978,10.748150024,12.537598741,12.146206429,12.272020359,12.175347765,13.474993522,11.913063691,12.253752345,12.013611481,11.697302459,10.129146619,10.794703848,10.225410994,10.631980772,10.809888203,10.883648614,9.5885634589,11.550187617,10.889184791,11.279541657,0.6190034045,1.7428948922,1.9207954353,1.6400395872,1.3654595625,2.591344908,2.3245002325,0.703564728,1.1244266903,0.4177608021,1.6319180665,2.6986759621,2.598723236,2.6014421038,2.6740249765,1.9579050416,2.4988377499,1.7002814259,1.420328451,1.1339221771,4.501842942,-9.445365867,-9.49098921,-1.41382723,-18.83196313,-14.10843339,-13.54021385,-11.49155722,-12.13197219,-8.71329673,6.1337610084,-6.746689905,-6.892265974,1.1876148735,-16.15793816,-12.15052835,-11.0413761,-9.791275797,-10.71164373,-7.579374552 +050,2,3,17,189,Illinois,Washington County,14716,14716,14711,14574,14598,14411,14389,14259,14176,13960,14010,13926,13764,-5,-137,24,-187,-22,-130,-83,-216,50,-84,-162,34,151,135,163,148,170,170,155,144,158,146,20,158,143,162,153,155,171,148,156,146,147,14,-7,-8,1,-5,15,-1,7,-12,12,-1,0,-1,0,1,3,2,4,5,7,3,1,-18,-130,33,-192,-19,-147,-87,-227,56,-99,-162,-18,-131,33,-191,-16,-145,-83,-222,63,-96,-161,-1,1,-1,3,-1,0,1,-1,-1,0,0,246,246,246,246,246,246,246,246,246,246,246,246,10.312446645,9.2554504319,11.237891689,10.277777778,11.868193242,11.957095129,11.017912994,10.296746514,11.311569301,10.545323221,10.790507086,9.8039215686,11.168947568,10.625,10.820999721,12.027430983,10.520329827,11.154808724,10.452462772,10.617551463,-0.47806044,-0.548471137,0.0689441208,-0.347222222,1.0471935214,-0.070335854,0.4975831675,-0.85806221,0.8591065292,-0.072228241,-0.068294349,0,0.0689441208,0.2083333333,0.1396258028,0.2813434148,0.3554165482,0.5005362889,0.2147766323,0.0722282412,-8.878265324,2.2624434389,-13.23727119,-1.319444444,-10.26249651,-6.119219272,-16.13591129,4.004290311,-7.087628866,-11.70097508,-8.946559672,2.2624434389,-13.16832707,-1.111111111,-10.12287071,-5.837875857,-15.78049474,4.5048265999,-6.872852234,-11.62874684 +050,2,3,17,191,Illinois,Wayne County,16760,16760,16739,16667,16668,16679,16610,16534,16573,16435,16311,16196,16031,-21,-72,1,11,-69,-76,39,-138,-124,-115,-165,56,194,211,193,215,199,231,185,190,209,200,71,195,211,199,243,226,174,210,194,209,224,-15,-1,0,-6,-28,-27,57,-25,-4,0,-24,1,6,7,14,11,6,6,7,7,6,4,-5,-77,-3,6,-49,-53,-23,-119,-127,-119,-145,-4,-71,4,20,-38,-47,-17,-112,-120,-113,-141,-2,0,-3,-3,-3,-2,-1,-1,0,-2,0,76,76,76,76,76,76,76,76,76,76,76,76,11.614679998,12.659367032,11.575254146,12.917179849,12.008206614,13.954752771,11.209403781,11.604470775,12.858768881,12.41195271,11.674549482,12.659367032,11.935106606,14.599417225,13.637460777,10.511372217,12.724188076,11.848775423,12.858768881,13.901387036,-0.059869485,0,-0.35985246,-1.682237376,-1.629254164,3.443380554,-1.514784295,-0.244304648,0,-1.489434325,0.3592169071,0.419979001,0.8396557411,0.660878969,0.3620564808,0.3624611109,0.4241396025,0.4275331338,0.3691512597,0.2482390542,-4.609950308,-0.179991,0.3598524605,-2.943915407,-3.19816558,-1.389434259,-7.210373243,-7.756672571,-7.321499985,-8.998665715,-4.250733401,0.2399880006,1.1995082016,-2.283036438,-2.8361091,-1.026973148,-6.78623364,-7.329139437,-6.952348725,-8.750426661 +050,2,3,17,193,Illinois,White County,14665,14665,14598,14592,14524,14435,14265,14204,14081,13898,13642,13574,13364,-67,-6,-68,-89,-170,-61,-123,-183,-256,-68,-210,29,180,157,176,153,165,162,157,148,111,121,74,223,208,242,209,235,221,243,231,184,199,-45,-43,-51,-66,-56,-70,-59,-86,-83,-73,-78,0,5,3,4,2,8,2,3,1,1,2,-21,31,-17,-27,-117,3,-64,-100,-173,4,-134,-21,36,-14,-23,-115,11,-62,-97,-172,5,-132,-1,1,-3,0,1,-2,-2,0,-1,0,0,391,391,391,391,391,391,391,391,391,391,391,391,12.33299075,10.784448413,12.155115853,10.662020906,11.591555727,11.454834718,11.222702741,10.748002905,8.1569664903,8.9835919519,15.279205207,14.287676879,16.713284298,14.56445993,16.50918543,15.626657239,17.370170485,16.775599129,13.521457966,14.774667756,-2.946214457,-3.503228465,-4.558168445,-3.902439024,-4.917629702,-4.171822521,-6.147467744,-6.027596224,-5.364491476,-5.791075804,0.3425830764,0.2060722627,0.276252633,0.1393728223,0.5620148231,0.1414177126,0.2144465492,0.0726216412,0.0734861846,0.1484891232,2.1240150737,-1.167742822,-1.864705273,-8.153310105,0.2107555587,-4.525366802,-7.148218307,-12.56354394,0.2939447384,-9.948771253,2.4665981501,-0.961670559,-1.58845264,-8.013937282,0.7727703818,-4.38394909,-6.933771757,-12.49092229,0.367430923,-9.800282129 +050,2,3,17,195,Illinois,Whiteside County,58498,58505,58489,58288,57772,57477,57037,56943,56505,56009,55532,55215,54656,-16,-201,-516,-295,-440,-94,-438,-496,-477,-317,-559,192,654,639,634,628,645,626,639,580,615,580,120,643,691,657,641,590,658,688,756,630,647,72,11,-52,-23,-13,55,-32,-49,-176,-15,-67,4,17,4,2,3,5,10,13,3,5,4,-93,-228,-473,-272,-434,-149,-415,-460,-304,-307,-495,-89,-211,-469,-270,-431,-144,-405,-447,-301,-302,-491,1,-1,5,-2,4,-5,-1,0,0,0,-1,1012,1012,1012,1010,1011,1010,1010,1010,1011,1011,1011,1011,11.200835781,11.011545752,11.002264662,10.968091238,11.317775048,11.035893096,11.358586487,10.399763316,11.106395659,10.557836008,11.012442519,11.907633982,11.401400446,11.195137712,10.352693455,11.600028207,12.229589207,13.555553563,11.377283358,11.777448098,0.1883932624,-0.89608823,-0.399135784,-0.227046475,0.9650815933,-0.56413511,-0.87100272,-3.155790248,-0.270887699,-1.219612091,0.2911532237,0.0689298639,0.0347074595,0.0523953403,0.0877346903,0.176292222,0.2310823542,0.0537918792,0.0902958997,0.0728126621,-3.904878529,-8.150956402,-4.720214492,-7.579859231,-2.614493771,-7.316127212,-8.176760225,-5.450910428,-5.544168239,-9.010566938,-3.613725305,-8.082026538,-4.685507033,-7.527463891,-2.526759081,-7.13983499,-7.945677871,-5.397118548,-5.45387234,-8.937754275 +050,2,3,17,197,Illinois,Will County,677560,677590,678829,680813,682459,683720,685123,685825,688330,690356,690934,690176,688726,1239,1984,1646,1261,1403,702,2505,2026,578,-758,-1450,2214,8198,8096,7839,7717,7927,7904,7444,7525,7199,7169,805,3909,3881,4084,4026,4327,4321,4677,4894,4790,5185,1409,4289,4215,3755,3691,3600,3583,2767,2631,2409,1984,150,916,687,462,437,488,299,438,215,-1,66,-293,-3227,-3300,-2961,-2724,-3394,-1369,-1170,-2283,-3189,-3511,-143,-2311,-2613,-2499,-2287,-2906,-1070,-732,-2068,-3190,-3445,-27,6,44,5,-1,8,-8,-9,15,23,11,8547,8547,8800,8815,9105,9205,8777,8736,8740,8745,8748,8743,12.059056722,11.87730695,11.475802219,11.275215638,11.564260643,11.503796879,10.798688026,10.895612073,10.424948049,10.398128366,5.750043026,5.6936546779,5.9787187477,5.8823400492,6.3124203106,6.2889557583,6.784721104,7.0861296324,6.9364496673,7.520476437,6.3090136963,6.1836522719,5.4970834715,5.3928755891,5.2518403324,5.2148411205,4.0139669221,3.8094824403,3.4884983817,2.8776519289,1.3474135103,1.0078693027,0.6763388985,0.6384954301,0.7119161339,0.4351765267,0.6353876082,0.3113032021,-0.001448111,0.0957283404,-4.746837771,-4.841293594,-4.334717486,-3.98000355,-4.951318358,-1.992497207,-1.697268268,-3.30560563,-4.618024632,-5.092457622,-3.39942426,-3.833424291,-3.658378587,-3.34150812,-4.239402224,-1.557320681,-1.06188066,-2.994302427,-4.619472743,-4.996729282 +050,2,3,17,199,Illinois,Williamson County,66357,66373,66440,66745,66793,67472,67439,67457,67504,67076,67017,66633,66415,67,305,48,679,-33,18,47,-428,-59,-384,-218,190,801,750,792,778,826,837,725,770,698,702,149,759,756,754,735,736,770,774,820,749,849,41,42,-6,38,43,90,67,-49,-50,-51,-147,6,40,52,70,66,49,43,50,41,23,25,25,225,18,564,-128,-116,-61,-425,-48,-357,-99,31,265,70,634,-62,-67,-18,-375,-7,-334,-74,-5,-2,-16,7,-14,-5,-2,-4,-2,1,3,1870,1870,1870,1870,2134,2137,1951,2001,2000,1999,2000,1997,12.028381575,11.232757717,11.797564518,11.533529512,12.246471356,12.403583257,10.774260663,11.484566681,10.445192667,10.552582527,11.397679919,11.322619779,11.231519756,10.896072225,10.91211007,11.410703833,11.502452073,12.230317765,11.208380097,12.762311346,0.6307016556,-0.089862062,0.5660447622,0.6374572867,1.3343612857,0.9928794244,-0.72819141,-0.745751083,-0.76318743,-2.20972882,0.6006682434,0.778804535,1.0427140357,0.9784228121,0.7264855889,0.6372211231,0.7430524595,0.6115158882,0.3441825664,0.375804221,3.3787588692,0.2695861852,8.4012959446,-1.897547272,-1.719843435,-0.903964849,-6.315945906,-0.71592104,-5.342312009,-1.488184715,3.9794271127,1.0483907202,9.4440099803,-0.91912446,-0.993357846,-0.266743726,-5.572893446,-0.104405152,-4.998129443,-1.112380494 +050,2,3,17,201,Illinois,Winnebago County,295266,295270,295090,293667,292128,291006,288770,287237,286171,284658,283588,282465,281295,-180,-1423,-1539,-1122,-2236,-1533,-1066,-1513,-1070,-1123,-1170,890,3776,3559,3621,3551,3641,3735,3557,3527,3438,3440,512,2762,2628,2815,2871,3048,2900,2954,3106,2869,2972,378,1014,931,806,680,593,835,603,421,569,468,68,359,392,353,388,445,381,447,379,203,187,-643,-2805,-2919,-2305,-3360,-2582,-2280,-2569,-1875,-1899,-1829,-575,-2446,-2527,-1952,-2972,-2137,-1899,-2122,-1496,-1696,-1642,17,9,57,24,56,11,-2,6,5,4,4,4685,4685,4709,4716,4730,4729,4729,4745,4745,4744,4742,4742,12.827023713,12.151008459,12.419100927,12.24955845,12.642207473,13.027373179,12.462576358,12.413637755,12.147272429,12.203774656,9.3824786797,8.9724220931,9.6547277298,9.9038249255,10.583204718,10.114961772,10.34985959,10.931885134,10.136859976,10.543493685,3.444545033,3.1785863655,2.7643731972,2.3457335247,2.0590027552,2.9124114069,2.1127167681,1.4817526212,2.0104124525,1.6602809706,1.2195184091,1.3383521539,1.2106994276,1.3384479523,1.5451201114,1.3288967018,1.5661432758,1.3339293193,0.7172473249,0.6634028665,-9.52854913,-9.965943718,-7.905558585,-11.5906833,-8.965168826,-7.952452704,-9.000944241,-6.599254548,-6.709619064,-6.488576699,-8.309030721,-8.627591564,-6.694859158,-10.25223535,-7.420048715,-6.623556002,-7.434800965,-5.265325229,-5.992371739,-5.825173833 +050,2,3,17,203,Illinois,Woodford County,38664,38656,38662,38849,38846,39039,39068,38949,38934,38676,38461,38353,38091,6,187,-3,193,29,-119,-15,-258,-215,-108,-262,111,443,458,441,442,426,435,405,427,426,405,64,318,398,363,373,413,373,421,392,363,430,47,125,60,78,69,13,62,-16,35,63,-25,4,15,21,15,14,12,0,3,2,1,0,-47,48,-81,106,-51,-143,-77,-246,-254,-171,-236,-43,63,-60,121,-37,-131,-77,-243,-252,-170,-236,2,-1,-3,-6,-3,-1,0,1,2,-1,-1,1021,1021,1027,1032,1021,1004,988,1002,1005,1005,1005,1005,11.430635652,11.789690456,11.324388522,11.317807623,10.920696771,11.170602057,10.436799382,11.071210962,11.09172807,10.595991837,8.2052869915,10.245189523,9.3214354497,9.5510005505,10.587436072,9.5784702695,10.849117382,10.163734654,9.4514020882,11.250065407,3.2253486602,1.5445009331,2.0029530718,1.7668070723,0.3332606996,1.5921317874,-0.412318,0.9074763084,1.6403259822,-0.65407357,0.3870418392,0.5405753266,0.385183283,0.3584825944,0.3076252612,0,0.077309625,0.0518557891,0.0260369204,0,1.2385338855,-2.08507626,2.7219618669,-1.30590088,-3.665867696,-1.977324962,-6.339389254,-6.585685209,-4.45231338,-6.174454503,1.6255757247,-1.544500933,3.1071451499,-0.947418285,-3.358242434,-1.977324962,-6.262079629,-6.53382942,-4.42627646,-6.174454503 +040,2,3,18,000,Indiana,Indiana,6483802,6484050,6490555,6517250,6538989,6570575,6596019,6611442,6637898,6662068,6698481,6731010,6754953,6505,26695,21739,31586,25444,15423,26456,24170,36413,32529,23943,20965,83476,83053,83369,83528,84205,83540,82219,82548,81204,80976,13851,57903,58608,60700,59828,62900,62133,65299,65706,63772,67236,7114,25573,24445,22669,23700,21305,21407,16920,16842,17432,13740,2493,9401,11135,9194,10133,8389,13904,9312,15414,10913,8743,-3053,-8217,-13573,73,-7683,-13954,-8704,-1882,4297,4163,1323,-560,1184,-2438,9267,2450,-5565,5200,7430,19711,15076,10066,-49,-62,-268,-350,-706,-317,-151,-180,-140,21,137,187366,187452,188071,188257,189136,189523,188719,189052,188253,189652,190093,190123,12.834755749,12.722346765,12.718805904,12.687867493,12.751126049,12.610439463,12.363791005,12.356977247,12.093384626,12.008931064,8.9028087368,8.9777768314,9.2604147628,9.0878476241,9.5249192862,9.3790332198,9.8194235985,9.8358233632,9.4973070833,9.9712567801,3.9319470118,3.7445699332,3.458391141,3.6000198685,3.226206763,3.2314062436,2.5443674067,2.5211538837,2.5960775431,2.037674284,1.4454398724,1.7056979426,1.4026400878,1.5391983682,1.2703425738,2.0988215262,1.4003043316,2.3073902128,1.6252291319,1.2966074429,-1.263395323,-2.079159243,0.0111369074,-1.167044416,-2.113048072,-1.313876767,-0.283008242,0.6432370406,0.6199788212,0.1962040086,0.1820445494,-0.373461301,1.4137769952,0.3721539526,-0.842705498,0.7849447595,1.1172960893,2.9506272534,2.2452079532,1.4928114514 +050,2,3,18,001,Indiana,Adams County,34387,34384,34442,34370,34408,34655,34771,34962,35216,35409,35565,35688,35839,58,-72,38,247,116,191,254,193,156,123,151,182,635,679,676,699,650,684,671,673,639,631,64,316,317,315,309,323,314,320,318,279,290,118,319,362,361,390,327,370,351,355,360,341,1,11,14,11,8,1,11,4,7,6,5,-63,-403,-345,-123,-286,-134,-126,-162,-207,-244,-194,-62,-392,-331,-112,-278,-133,-115,-158,-200,-238,-189,2,1,7,-2,4,-3,-1,0,1,1,-1,421,421,421,421,421,421,421,421,421,421,421,421,18.456083241,19.744685801,19.576328859,20.136548267,18.642536532,19.493288495,19.001769912,18.964691295,17.936086902,17.643686999,9.1844445736,9.2180639158,9.1221059033,8.9015642555,9.2639066152,8.9486733734,9.0619469027,8.9610279821,7.8312492106,8.1088260377,9.2716386677,10.526621885,10.454222956,11.234984012,9.378629917,10.544615122,9.9398230088,10.003663313,10.104837691,9.5348609616,0.3197116782,0.4071069237,0.31854973,0.2304612105,0.0286808254,0.3134885577,0.1132743363,0.1972553329,0.1684139615,0.1398073455,-11.7130733,-10.03227776,-3.561965162,-8.238988275,-3.843230608,-3.590868933,-4.587610619,-5.833121988,-6.848834435,-5.424525005,-11.39336162,-9.62517084,-3.243415432,-8.008527065,-3.814549783,-3.277380376,-4.474336283,-5.635866655,-6.680420474,-5.284717659 +050,2,3,18,003,Indiana,Allen County,355329,355339,355956,359013,360946,363432,365254,367508,369526,371803,375076,379006,382187,617,3057,1933,2486,1822,2254,2018,2277,3273,3930,3181,1345,5261,5206,5180,5143,5273,5215,5221,5140,5292,5286,579,2848,2935,3025,3031,3244,3227,3427,3358,3386,3415,766,2413,2271,2155,2112,2029,1988,1794,1782,1906,1871,198,805,789,630,566,434,643,420,734,504,393,-332,-145,-1082,-245,-800,-161,-597,81,772,1514,897,-134,660,-293,385,-234,273,46,501,1506,2018,1290,-15,-16,-45,-54,-56,-48,-16,-18,-15,6,20,6105,6105,6127,6118,6102,6097,6101,6065,6125,6120,6125,6125,14.716721984,14.461934638,14.301925238,14.115819434,14.392121862,14.151314593,14.085513989,13.763943022,14.03560886,13.888724673,7.9667789792,8.1532420596,8.3519930202,8.3190839401,8.8541709314,8.7567195001,9.2455576404,8.9920857328,8.9804557064,8.9727572377,6.7499430045,6.3086925783,5.9499322177,5.7967354938,5.5379509309,5.3945950933,4.8399563487,4.7718572888,5.0551531531,4.9159674353,2.2518458842,2.191791477,1.7394233397,1.5534811977,1.184559243,1.7448313104,1.1331001485,1.965512486,1.3367246533,1.0325896323,-0.405611992,-3.005726715,-0.67644241,-2.195733142,-0.439433268,-1.620006675,0.2185264572,2.0672692632,4.0154784228,2.3568267181,1.8462338927,-0.813935238,1.0629809298,-0.642251944,0.7451259754,0.124824635,1.3516266057,4.0327817491,5.3522030761,3.3894163504 +050,2,3,18,005,Indiana,Bartholomew County,76794,76782,76823,77639,79031,79692,80546,81516,82373,82455,83062,84063,84447,41,816,1392,661,854,970,857,82,607,1001,384,249,985,1069,1051,1096,1083,1077,1065,1048,1030,1051,205,712,701,679,771,739,733,813,737,735,790,44,273,368,372,325,344,344,252,311,295,261,73,271,323,305,426,419,677,467,731,539,418,-72,275,681,-2,123,212,-161,-638,-436,164,-298,1,546,1004,303,549,631,516,-171,295,703,120,-4,-3,20,-14,-20,-5,-3,1,1,3,3,1147,1147,1147,1147,1147,1147,1147,1147,1148,1148,1147,1148,12.753945954,13.646518159,13.243197268,13.679651518,13.365255273,13.143041937,12.922561701,12.663351801,12.326103216,12.474037149,9.2190959589,8.9487457714,8.5557858659,9.6231855116,9.1199664326,8.9450786813,9.8648287912,8.9054296538,8.7958115183,9.3762981425,3.5348499955,4.6977723878,4.6874114023,4.0564660068,4.2452888401,4.1979632556,3.0577329095,3.757922147,3.5302916978,3.0977390066,3.5089536585,4.1233165252,3.8431733271,5.3170908274,5.1708605349,8.2616893141,5.6665129711,8.832929548,6.4502617801,4.9611299033,3.5607463324,8.6934320546,-0.025201137,1.5352163657,2.6162826573,-1.964744431,-7.74140316,-5.268341016,1.9626028422,-3.536882084,7.0696999909,12.81674858,3.8179721905,6.8523071931,7.7871431921,6.2969448834,-2.074890189,3.5645885317,8.4128646223,1.4242478191 +050,2,3,18,007,Indiana,Benton County,8854,8836,8863,8859,8824,8752,8724,8698,8659,8637,8677,8763,8741,27,-4,-35,-72,-28,-26,-39,-22,40,86,-22,20,99,98,106,116,114,107,118,109,103,112,14,82,78,99,87,94,84,73,88,89,92,6,17,20,7,29,20,23,45,21,14,20,0,1,5,1,2,1,0,4,7,0,1,21,-22,-61,-79,-63,-47,-63,-71,13,71,-42,21,-21,-56,-78,-61,-46,-63,-67,20,71,-41,0,0,1,-1,4,0,1,0,-1,1,-1,92,92,92,92,92,92,92,92,92,92,92,92,11.172553888,11.084092066,12.061902594,13.27534905,13.086901619,12.329319583,13.644773358,12.590966848,11.811926606,12.797074954,9.2540345333,8.8220324606,11.265361857,9.9565117876,10.790953966,9.679092009,8.4412580944,10.165184244,10.206422018,10.511882998,1.9185193545,2.2620596053,0.7965407374,3.3188372625,2.2959476524,2.6502275739,5.2035152636,2.4257826037,1.6055045872,2.2851919561,0.1128540797,0.5655149013,0.1137915339,0.2288853285,0.1147973826,0,0.4625346901,0.8085942012,0,0.1142595978,-2.482789753,-6.899281796,-8.989531179,-7.209887846,-5.395476983,-7.259319007,-8.209990749,1.5016749451,8.1422018349,-4.798903108,-2.369935673,-6.333766895,-8.875739645,-6.981002518,-5.280679601,-7.259319007,-7.747456059,2.3102691464,8.1422018349,-4.68464351 +050,2,3,18,009,Indiana,Blackford County,12766,12766,12771,12655,12527,12456,12342,12237,12109,12019,11934,11787,11782,5,-116,-128,-71,-114,-105,-128,-90,-85,-147,-5,33,145,144,136,126,150,125,115,136,150,139,22,146,137,143,172,174,161,159,165,169,171,11,-1,7,-7,-46,-24,-36,-44,-29,-19,-32,1,6,9,-1,3,7,11,5,7,4,3,-7,-121,-148,-65,-71,-88,-102,-51,-62,-133,25,-6,-115,-139,-66,-68,-81,-91,-46,-55,-129,28,0,0,4,2,0,0,-1,0,-1,1,-1,163,163,163,163,163,163,163,163,163,163,163,163,11.405647762,11.436740529,10.887403434,10.162109848,12.205541316,10.26862729,9.5324933687,11.355571327,12.647021626,11.795154652,11.484307402,10.880787864,11.447784493,13.872086459,14.158427926,13.225991949,13.179708223,13.776979919,14.248977699,14.510585939,-0.07865964,0.5559526646,-0.560381059,-3.709976611,-1.952886611,-2.957364659,-3.647214854,-2.421408592,-1.601956073,-2.715431287,0.4719578384,0.7147962831,-0.080054437,0.2419549964,0.5695919281,0.9036392015,0.4144562334,0.584477936,0.33725391,0.2545716831,-9.517816408,-11.75442777,-5.203538406,-5.726268247,-7.160584239,-8.379199869,-4.227453581,-5.176804576,-11.21369251,2.1214306929,-9.04585857,-11.03963148,-5.283592843,-5.484313251,-6.590992311,-7.475560667,-3.812997347,-4.59232664,-10.8764386,2.376002376 +050,2,3,18,011,Indiana,Boone County,56640,56647,56924,57924,59050,60373,61663,63080,64274,65833,66999,67915,69347,277,1000,1126,1323,1290,1417,1194,1559,1166,916,1432,164,698,702,728,758,768,796,795,789,782,776,88,436,477,528,505,534,530,548,544,493,524,76,262,225,200,253,234,266,247,245,289,252,18,46,59,46,48,37,103,68,109,75,57,177,690,831,1056,977,1137,825,1242,813,553,1128,195,736,890,1102,1025,1174,928,1310,922,628,1185,6,2,11,21,12,9,0,2,-1,-1,-5,574,574,574,574,574,574,574,574,574,574,574,574,12.155196434,12.002667259,12.191956323,12.422563834,12.313316178,12.50058891,12.220710646,11.87966755,11.592570082,11.306843846,7.5926441906,8.1556585224,8.842517773,8.2762463535,8.5616026551,8.3232564348,8.4238357659,8.1907973982,7.3083593993,7.6350337311,4.562552243,3.847008737,3.3494385504,4.1463174801,3.751713523,4.1773324748,3.7968748799,3.6888701518,4.2842106824,3.671810115,0.8010587907,1.0087711799,0.7703708666,0.7866531188,0.5932196596,1.6175385147,1.0452934892,1.6411708022,1.1118193812,0.8305284784,12.015881861,14.208285602,17.685035546,16.011668688,18.22947981,12.956012375,19.091978141,12.241026259,8.1978149043,16.435721467,12.816940652,15.217056782,18.455406413,16.798321807,18.82269947,14.57355089,20.13727163,13.882197061,9.3096342855,17.266249945 +050,2,3,18,013,Indiana,Brown County,15242,15247,15210,15079,15053,15062,14953,15003,15017,15025,15244,15066,15112,-37,-131,-26,9,-109,50,14,8,219,-178,46,19,109,123,129,108,109,124,112,124,121,117,53,138,154,150,140,147,179,148,168,167,175,-34,-29,-31,-21,-32,-38,-55,-36,-44,-46,-58,1,-3,-3,1,0,-1,1,-2,-2,-1,-2,-2,-98,9,31,-78,90,68,46,265,-129,108,-1,-101,6,32,-78,89,69,44,263,-130,106,-2,-1,-1,-2,1,-1,0,0,0,-2,-2,163,163,163,163,163,163,163,163,163,163,163,163,7.1973323649,8.1640780566,8.567159223,7.1964017991,7.2773400988,8.2611592272,7.4562279475,8.1932009647,7.9841636424,7.753992975,9.1122189574,10.221691225,9.96181305,9.3286689988,9.8143944452,11.925383078,9.852872645,11.100465823,11.019465523,11.59785274,-1.914886592,-2.057613169,-1.394653827,-2.1322672,-2.537054346,-3.664223851,-2.396644697,-2.907264858,-3.035301881,-3.843859765,-0.198091716,-0.199123855,0.066412087,0,-0.066764588,0.0666222518,-0.133146928,-0.132148403,-0.065984823,-0.132546888,-6.470996071,0.5973715651,2.058774697,-5.197401299,6.0088129256,4.5303131246,3.0623793356,17.509663352,-8.51204223,7.1575319769,-6.669087788,0.3982477101,2.125186784,-5.197401299,5.9420483376,4.5969353764,2.929232408,17.377514949,-8.578027054,7.0249850885 +050,2,3,18,015,Indiana,Carroll County,20155,20160,20200,20042,20112,20117,19958,19891,19966,20074,20208,20211,20228,40,-158,70,5,-159,-67,75,108,134,3,17,68,204,204,234,226,194,193,224,238,196,198,30,192,154,177,175,203,174,191,201,199,214,38,12,50,57,51,-9,19,33,37,-3,-16,2,-4,10,5,7,3,13,12,21,21,16,1,-167,9,-54,-222,-58,43,63,77,-16,18,3,-171,19,-49,-215,-55,56,75,98,5,34,-1,1,1,-3,5,-3,0,0,-1,1,-1,106,106,106,106,106,106,106,106,106,106,106,106,10.1386611,10.16088061,11.633398792,11.278852152,9.7367562549,9.6846225255,11.188811189,11.816692319,9.698409164,9.792527016,9.5422692709,7.6704686955,8.7996221631,8.7336244541,10.188461442,8.7312140904,9.5404595405,9.9796435132,9.8468542022,10.58384233,0.5963918294,2.4904119141,2.8337766288,2.5452276981,-0.451705187,0.9534084352,1.6483516484,1.8370488059,-0.148445038,-0.791315314,-0.198797276,0.4980823828,0.2485768973,0.3493449782,0.1505683957,0.6523320872,0.5994005994,1.0426493223,1.0391152676,0.7913153144,-8.299786293,0.4482741445,-2.68463049,-11.07922645,-2.910988983,2.1577138269,3.1468531469,3.823047515,-0.791706871,0.8902297287,-8.498583569,0.9463565274,-2.436053593,-10.72988147,-2.760420588,2.8100459141,3.7462537463,4.8656968373,0.247408397,1.6815450432 +050,2,3,18,017,Indiana,Cass County,38966,38970,38985,38917,38771,38580,38482,38079,37927,37827,37885,37610,37388,15,-68,-146,-191,-98,-403,-152,-100,58,-275,-222,108,514,503,505,475,504,504,460,430,417,402,66,339,403,393,394,425,394,442,411,434,439,42,175,100,112,81,79,110,18,19,-17,-37,24,60,107,95,77,31,111,71,123,100,82,-51,-303,-357,-405,-259,-517,-374,-189,-84,-358,-267,-27,-243,-250,-310,-182,-486,-263,-118,39,-258,-185,0,0,4,7,3,4,1,0,0,0,0,1066,1073,1061,1077,1055,1053,1033,1042,1055,1046,1052,1052,13.196066853,12.949232829,13.057361896,12.327736109,13.165972231,13.262110886,12.144573224,11.358833474,11.047089211,10.720285874,8.7032425355,10.374832664,10.161471733,10.225532688,11.10225833,10.367602558,11.669350793,10.85693153,11.497450162,11.706978853,4.4928243177,2.5744001648,2.895890163,2.1022034206,2.0637139013,2.8945083283,0.4752224305,0.5019019442,-0.450360951,-0.986692978,1.5403969089,2.7546081763,2.4563354061,1.998390906,0.8098117841,2.9208220404,1.8744884759,3.2491546915,2.649182065,2.1867249793,-7.77900439,-9.190608588,-10.47174568,-6.72186032,-13.50557072,-9.841328316,-4.98983552,-2.218934911,-9.484071793,-7.120189872,-6.238607481,-6.436000412,-8.015410273,-4.723469414,-12.69575894,-6.920506276,-3.115347044,1.0302197802,-6.834889728,-4.933464892 +050,2,3,18,019,Indiana,Clark County,110232,110221,110572,111504,111879,112722,114082,114887,115660,116648,117287,118191,119266,351,932,375,843,1360,805,773,988,639,904,1075,344,1441,1465,1457,1485,1472,1456,1448,1483,1378,1396,244,1019,1083,1152,1121,1183,1271,1277,1289,1236,1299,100,422,382,305,364,289,185,171,194,142,97,29,81,106,58,48,4,66,43,82,82,65,213,432,-87,478,933,518,524,772,363,677,912,242,513,19,536,981,522,590,815,445,759,977,9,-3,-26,2,15,-6,-2,2,0,3,1,1515,1515,1484,1515,1462,1491,1466,1327,1325,1327,1328,1328,12.977539221,13.116486035,12.974118548,13.095007143,12.85763575,12.630830156,12.466208654,12.678735546,11.703853439,11.757918276,9.1770384913,9.69635111,10.258191192,9.8851872101,10.333276557,11.025951324,10.994025173,11.020155171,10.497795972,10.940928252,3.8005007295,3.4201349252,2.7159273556,3.2098199326,2.5243591927,1.6048788316,1.4721834806,1.6585803749,1.2060574661,0.8169900235,0.7294799978,0.9490426756,0.5164714316,0.4232729581,0.0349392276,0.572551367,0.3701981852,0.7010494368,0.6964557199,0.5474675415,3.8905599885,-0.778931253,4.2564369704,8.227368124,4.5246299717,4.5457108529,6.6463488128,3.1034261654,5.75000637,7.681390736,4.6200399863,0.170111423,4.772908402,8.6506410822,4.5595691993,5.1182622199,7.016546998,3.8044756022,6.4464620899,8.2288582775 +050,2,3,18,021,Indiana,Clay County,26890,26896,26863,26847,26796,26670,26439,26406,26218,26176,26215,26301,26246,-33,-16,-51,-126,-231,-33,-188,-42,39,86,-55,70,325,317,299,317,320,328,325,303,338,324,80,293,292,285,288,341,291,326,319,302,303,-10,32,25,14,29,-21,37,-1,-16,36,21,2,1,-1,0,0,1,1,0,0,0,1,-23,-49,-73,-141,-263,-10,-227,-41,56,50,-77,-21,-48,-74,-141,-263,-9,-226,-41,56,50,-76,-2,0,-2,1,3,-3,1,0,-1,0,0,341,341,341,341,341,341,341,341,341,341,341,341,12.102029417,11.818876647,11.184678113,11.937713005,12.11089034,12.465795074,12.406000687,11.566872173,12.872267499,12.33181723,10.910444982,10.886788584,10.66098081,10.845619387,12.905667518,11.059592581,12.444172997,12.177664103,11.50125676,11.53253278,1.1915844349,0.9320880637,0.523697303,1.0920936188,-0.794777179,1.4062024932,-0.03817231,-0.61079193,1.3710107396,0.7992844501,0.0372370136,-0.037283523,0,0,0.0378465323,0.0380054728,0,0,0,0.0380611643,-1.824613666,-2.721697146,-5.27437998,-9.90415937,-0.378465323,-8.627242323,-1.565064702,2.1377717547,1.9041815828,-2.93070965,-1.787376652,-2.758980668,-5.27437998,-9.90415937,-0.340618791,-8.58923685,-1.565064702,2.1377717547,1.9041815828,-2.892648486 +050,2,3,18,023,Indiana,Clinton County,33224,33219,33222,33034,32889,32765,32461,32372,32156,32155,32113,32298,32206,3,-188,-145,-124,-304,-89,-216,-1,-42,185,-92,113,430,417,467,425,489,425,463,429,415,421,64,339,368,381,347,387,388,365,404,331,343,49,91,49,86,78,102,37,98,25,84,78,10,22,32,10,-5,-1,-1,-6,4,-2,1,-57,-303,-230,-222,-386,-189,-252,-92,-70,105,-172,-47,-281,-198,-212,-391,-190,-253,-98,-66,103,-171,1,2,4,2,9,-1,0,-1,-1,-2,1,830,830,830,830,830,830,830,830,831,831,831,831,12.979956532,12.65112328,14.226094374,13.03161316,15.084910462,13.172576246,14.398780924,13.350345429,12.885997733,13.053454049,10.233035499,11.164540449,11.606299692,10.639928863,11.938364722,12.025787255,11.351090793,12.572353271,10.27774759,10.63499938,2.7469210336,1.4865828315,2.6197946812,2.3916842977,3.1465457406,1.1467889908,3.0476901308,0.7779921578,2.6082501436,2.4184546695,0.6640907993,0.9708296042,0.3046272885,-0.153313096,-0.030848488,-0.030994297,-0.186593273,0.1244787453,-0.062101194,0.0310058291,-9.146341463,-6.97783778,-6.762725805,-11.83577101,-5.830364166,-7.810562856,-2.861096857,-2.178378042,3.2603126795,-5.333002604,-8.482250664,-6.007008176,-6.458098516,-11.98908411,-5.861212654,-7.841557153,-3.047690131,-2.053899297,3.1982114856,-5.301996775 +050,2,3,18,025,Indiana,Crawford County,10713,10713,10711,10622,10669,10621,10669,10556,10569,10532,10585,10593,10629,-2,-89,47,-48,48,-113,13,-37,53,8,36,30,98,121,102,126,135,95,117,124,120,118,46,110,99,130,109,109,116,130,143,105,128,-16,-12,22,-28,17,26,-21,-13,-19,15,-10,0,0,0,0,0,0,3,3,5,0,0,14,-77,27,-20,33,-140,30,-26,67,-8,46,14,-77,27,-20,33,-140,33,-23,72,-8,46,0,0,-2,0,-2,1,1,-1,0,1,0,62,62,62,62,62,62,62,62,62,62,62,62,9.1876435569,11.366305012,9.5819633631,11.836542978,12.720848057,8.9940828402,11.089521824,11.744092437,11.332514874,11.120535294,10.312661135,9.2997041003,12.212306247,10.239549084,10.270906949,10.982248521,12.321690915,13.543590472,9.9159505147,12.062953539,-1.125017578,2.0666009112,-2.630342884,1.5969938938,2.4499411072,-1.98816568,-1.232169092,-1.799498035,1.4165643592,-0.942418245,0,0,0,0,0,0.2840236686,0.2843467134,0.4735521144,0,0,-7.218862795,2.5362829365,-1.878816346,3.1000469704,-13.19199058,2.8402366864,-2.464338183,6.3455983331,-0.755500992,4.335123928,-7.218862795,2.5362829365,-1.878816346,3.1000469704,-13.19199058,3.124260355,-2.17999147,6.8191504475,-0.755500992,4.335123928 +050,2,3,18,027,Indiana,Daviess County,31648,31654,31721,31952,32113,32274,32671,32819,33000,33127,33314,33439,33505,67,231,161,161,397,148,181,127,187,125,66,144,521,531,521,533,546,524,534,580,565,573,92,328,351,328,332,346,322,327,347,342,346,52,193,180,193,201,200,202,207,233,223,227,8,28,15,12,0,8,21,16,22,9,10,11,12,-33,-42,199,-57,-40,-95,-67,-109,-170,19,40,-18,-30,199,-49,-19,-79,-45,-100,-160,-4,-2,-1,-2,-3,-3,-2,-1,-1,2,-1,581,581,581,581,581,581,581,581,581,581,581,581,16.364864228,16.576914072,16.183391057,16.413888675,16.67430142,15.922454003,16.150740242,17.45909905,16.928078139,17.118785851,10.302640052,10.957621166,10.188392067,10.224035723,10.566498702,9.7844087573,9.890060036,10.445357535,10.246730484,10.336998088,6.0622241767,5.6192929056,5.9949989905,6.1898529525,6.107802718,6.1380452453,6.2606802063,7.013741515,6.6813476548,6.7817877629,0.8794936629,0.4682744088,0.3727460512,0,0.2443121087,0.6381136146,0.4839173106,0.6622416881,0.2696508022,0.2987571702,0.3769258555,-1.030203699,-1.304611179,6.1282623759,-1.740723775,-1.215454504,-2.873259032,-2.016826959,-3.265770827,-5.078871893,1.2564195185,-0.561929291,-0.931865128,6.1282623759,-1.496411666,-0.577340889,-2.389341721,-1.354585271,-2.996120025,-4.780114723 +050,2,3,18,029,Indiana,Dearborn County,50047,50025,50082,49990,49742,49757,49448,49491,49468,49634,49560,49573,49824,57,-92,-248,15,-309,43,-23,166,-74,13,251,128,549,531,512,511,508,502,495,537,523,532,75,464,459,430,432,472,484,532,517,480,497,53,85,72,82,79,36,18,-37,20,43,35,4,-6,1,-8,-9,-6,3,6,13,0,6,6,-170,-324,-58,-383,18,-40,202,-107,-29,209,10,-176,-323,-66,-392,12,-37,208,-94,-29,215,-6,-1,3,-1,4,-5,-4,-5,0,-1,1,530,530,530,530,530,530,530,530,530,530,530,530,10.972100088,10.648538082,10.291560719,10.301900106,10.268953598,10.145615861,9.989707574,10.827267778,10.551481343,10.704548427,9.2733232073,9.2046685116,8.6433029478,8.7092384456,9.5412324766,9.7818288382,10.736412989,10.424017582,9.6839599326,10.00030182,1.6987768806,1.4438695704,1.6482577714,1.5926616602,0.7277211211,0.3637870229,-0.746705415,0.4032501966,0.8675214106,0.704246607,-0.119913662,0.020053744,-0.160805636,-0.181442468,-0.121286854,0.0606311705,0.1210873645,0.2621126278,0,0.1207279898,-3.397553761,-6.497413067,-1.165840863,-7.721385011,0.3638605605,-0.808415606,4.0766079393,-2.157388552,-0.585072579,4.2053583106,-3.517467423,-6.477359323,-1.326646499,-7.902827478,0.242573707,-0.747784436,4.1976953038,-1.895275924,-0.585072579,4.3260863004 +050,2,3,18,031,Indiana,Decatur County,25740,25737,25795,25900,26041,26232,26411,26338,26569,26627,26685,26472,26584,58,105,141,191,179,-73,231,58,58,-213,112,73,317,289,365,341,341,365,358,337,315,315,29,257,246,293,258,240,292,288,299,277,297,44,60,43,72,83,101,73,70,38,38,18,10,40,26,38,9,14,24,13,23,16,11,6,6,77,86,91,-188,135,-23,-2,-267,81,16,46,103,124,100,-174,159,-10,21,-251,92,-2,-1,-5,-5,-4,0,-1,-2,-1,0,2,377,377,377,377,377,377,377,377,377,377,377,377,12.26424219,11.128010627,13.96514453,12.955188724,12.929155055,13.797796133,13.459658621,12.642557023,11.851684632,11.87424608,9.9429345198,9.4722858628,11.210376294,9.8018729936,9.0996985725,11.038236906,10.827881796,11.216986795,10.421957597,11.195717732,2.32130767,1.6557247646,2.754768236,3.1533157305,3.8294564826,2.7595592266,2.6317768253,1.4255702281,1.429727035,0.6785283474,1.5475384467,1.0011359042,1.4539054579,0.3419258021,0.5308157501,0.9072523485,0.4887585533,0.8628451381,0.6019903305,0.4146562123,0.232130767,2.9649024855,3.2904176152,3.4572497768,-7.128097215,5.1032944601,-0.864726671,-0.075030012,-10.04571364,3.0533775633,1.7796692137,3.9660383897,4.7443230731,3.7991755789,-6.597281465,6.0105468086,-0.375968118,0.7878151261,-9.44372331,3.4680337756 +050,2,3,18,033,Indiana,DeKalb County,42223,42255,42335,42500,42337,42378,42442,42511,42671,42830,43231,43561,43670,80,165,-163,41,64,69,160,159,401,330,109,156,518,520,496,520,563,535,507,537,554,541,68,389,362,399,406,450,405,453,447,409,431,88,129,158,97,114,113,130,54,90,145,110,4,16,3,-3,-4,-7,-4,-2,0,-3,-2,-9,21,-327,-49,-37,-33,37,108,312,189,0,-5,37,-324,-52,-41,-40,33,106,312,186,-2,-3,-1,3,-4,-9,-4,-3,-1,-1,-1,1,615,615,615,615,615,615,615,615,615,615,615,615,12.211940826,12.258802174,11.709850676,12.261259137,13.25438772,12.56133925,11.859510415,12.47952034,12.766153563,12.403847256,9.1707432074,8.5340122824,9.4198193944,9.5732138647,10.594093204,9.509051208,10.596367294,10.387980618,9.4248317817,9.8818080728,3.0411976189,3.7247898912,2.2900312814,2.6880452723,2.6602945158,3.0522880421,1.2631431211,2.0915397218,3.3413217808,2.5220391833,0.3772028054,0.0707238587,-0.07082571,-0.094317378,-0.164797005,-0.093916555,-0.046783079,0,-0.069130795,-0.045855258,0.4950786821,-7.708900598,-1.156819926,-0.872435746,-0.776900168,0.8687281351,2.5262862423,7.2506710357,4.3552401143,0,0.8722814876,-7.638176739,-1.227645635,-0.966753124,-0.941697174,0.7748115799,2.4795031637,7.2506710357,4.2861093188,-0.045855258 +050,2,3,18,035,Indiana,Delaware County,117671,117674,117671,117914,117053,116867,116528,115814,115696,115268,114118,113769,113454,-3,243,-861,-186,-339,-714,-118,-428,-1150,-349,-315,323,1265,1220,1292,1238,1187,1173,1168,1114,1060,1064,259,1171,1231,1254,1188,1236,1222,1335,1362,1275,1266,64,94,-11,38,50,-49,-49,-167,-248,-215,-202,35,153,186,158,165,113,171,99,164,103,86,-91,1,-1053,-369,-549,-779,-232,-359,-1073,-240,-207,-56,154,-867,-211,-384,-666,-61,-260,-909,-137,-121,-11,-5,17,-13,-5,1,-8,-1,7,3,8,8830,8832,9131,8806,8644,8564,8409,8747,8870,8597,8598,8601,10.739223635,10.384436963,11.046511628,10.608624863,10.217696327,10.133471556,10.114130341,9.7128857036,9.3028562402,9.3652491165,9.9412101789,10.478067133,10.721614227,10.18016667,10.63948834,10.556779405,11.560243155,11.875179828,11.189756327,11.143238141,0.7980134559,-0.093630169,0.3248974008,0.4284581932,-0.421792013,-0.423307848,-1.446112814,-2.162294124,-1.886900086,-1.777989024,1.298894242,1.5832010453,1.3508891929,1.4139120375,0.9727040311,1.4772580018,0.8572764587,1.429904179,0.9039567856,0.7569656241,0.0084895048,-8.962960756,-3.154924761,-4.704470961,-6.705632215,-2.004233078,-3.108709582,-9.355409659,-2.106307073,-1.821998653,1.3073837468,-7.379759711,-1.804035568,-3.290558924,-5.732928183,-0.526975077,-2.251433124,-7.92550548,-1.202350288,-1.065033029 +050,2,3,18,037,Indiana,Dubois County,41889,41886,41905,42159,42084,42281,42306,42329,42463,42520,42568,42578,42542,19,254,-75,197,25,23,134,57,48,10,-36,127,507,509,538,542,572,584,577,510,528,503,65,400,411,379,413,420,398,434,407,409,446,62,107,98,159,129,152,186,143,103,119,57,14,38,43,44,59,43,77,48,74,55,41,-60,112,-215,1,-161,-171,-126,-134,-130,-163,-134,-46,150,-172,45,-102,-128,-49,-86,-56,-108,-93,3,-3,-1,-7,-2,-1,-3,0,1,-1,0,893,893,893,893,893,893,893,893,894,894,894,894,12.062238295,12.084090073,12.75410419,12.815208011,13.516866545,13.774884423,13.579186426,11.987589319,12.402226763,11.818609023,9.5165588123,9.757487269,8.9847685652,9.765093927,9.9249719383,9.3876780828,10.213807467,9.5665663783,9.6070279285,10.479323308,2.5456794823,2.3266028038,3.769335625,3.0501140837,3.5918946063,4.3872063402,3.3653789581,2.421022941,2.7951988349,1.3392857143,0.9040730872,1.0208563323,1.043086588,1.3950134181,1.0161280794,1.8162090763,1.1296376922,1.7393757052,1.2918986212,0.9633458647,2.6646364675,-5.104281661,0.0237065134,-3.806731531,-4.040881432,-2.971978489,-3.153571891,-3.055660023,-3.828717732,-3.148496241,3.5687095546,-4.083425329,1.0667931014,-2.411718113,-3.024753353,-1.155769412,-2.023934199,-1.316284317,-2.536819111,-2.185150376 +050,2,3,18,039,Indiana,Elkhart County,197559,197569,197453,198292,198988,200225,201446,203022,203626,204279,205588,206268,206161,-116,839,696,1237,1221,1576,604,653,1309,680,-107,736,3053,2982,3019,3041,3184,3089,3133,3116,3125,3098,318,1516,1661,1651,1622,1733,1691,1798,1738,1662,1817,418,1537,1321,1368,1419,1451,1398,1335,1378,1463,1281,5,-19,73,94,88,60,208,128,258,176,150,-564,-676,-684,-204,-249,86,-999,-806,-324,-964,-1539,-559,-695,-611,-110,-161,146,-791,-678,-66,-788,-1389,25,-3,-14,-21,-37,-21,-3,-4,-3,5,1,3804,3804,3767,3758,3708,3679,3647,3642,3665,3691,3688,3691,15.429127342,15.012082159,15.124757961,15.141745359,15.744137979,15.192500639,15.361419938,15.204932332,15.175206868,15.023191871,7.6614991977,8.3618606524,8.2712737311,8.0762614179,8.5692811298,8.3167751962,8.8157781836,8.4807998692,8.0707820209,8.8112135665,7.7676281444,6.6502215062,6.8534842302,7.0654839408,7.174856849,6.8757254431,6.5456417548,6.7241324625,7.1044248475,6.2119783041,-0.096021428,0.3674989932,0.470926548,0.4381695467,0.2966860172,1.0229977769,0.6275971121,1.2589449748,0.8546676508,0.7273979279,-3.416341331,-3.443415224,-1.022010806,-1.239820649,0.425249958,-4.913340284,-3.951900565,-1.581000666,-4.681247815,-7.46310274,-3.512362759,-3.07591623,-0.551084258,-0.801651103,0.7219359752,-3.890342508,-3.324303453,-0.322055691,-3.826580164,-6.735704812 +050,2,3,18,041,Indiana,Fayette County,24277,24302,24325,24152,23949,23827,23443,23389,23246,23138,23026,23038,22892,23,-173,-203,-122,-384,-54,-143,-108,-112,12,-146,62,233,233,264,239,249,233,245,278,273,271,54,322,307,344,298,311,313,347,355,320,309,8,-89,-74,-80,-59,-62,-80,-102,-77,-47,-38,0,1,3,8,6,2,7,4,7,6,5,17,-84,-131,-45,-338,9,-69,-7,-40,52,-112,17,-83,-128,-37,-332,11,-62,-3,-33,58,-107,-2,-1,-1,-5,7,-3,-1,-3,-2,1,-1,392,392,392,392,392,392,392,392,392,392,392,392,9.612806073,9.6879482755,11.051574012,10.112121853,10.633754698,9.9924949073,10.563987582,12.044016983,11.853073984,11.800566079,13.284650453,12.764807384,14.400535834,12.608419717,13.281516912,13.423394446,14.962055881,15.379949744,13.893713095,13.455258001,-3.67184438,-3.076859109,-3.348961822,-2.496297863,-2.647762214,-3.430899539,-4.398068299,-3.335932761,-2.040639111,-1.654691922,0.0412566784,0.1247375314,0.3348961822,0.2538607997,0.0854116843,0.3002037097,0.1724732666,0.3032666147,0.2605071205,0.2177226214,-3.465560988,-5.446872206,-1.883791025,-14.30082505,0.3843525794,-2.959150852,-0.301828217,-1.732952084,2.2577283779,-4.876986719,-3.424304309,-5.322134675,-1.548894843,-14.04696425,0.4697642638,-2.658947143,-0.12935495,-1.429685469,2.5182354984,-4.659264098 +050,2,3,18,043,Indiana,Floyd County,74578,74575,74706,74987,75284,76053,76138,76559,76801,77043,77870,78601,78936,131,281,297,769,85,421,242,242,827,731,335,258,874,898,845,920,860,942,870,880,855,853,128,716,730,738,741,765,728,817,867,779,817,130,158,168,107,179,95,214,53,13,76,36,2,-1,27,34,31,13,37,35,63,65,51,6,128,114,623,-119,323,-6,157,751,592,248,8,127,141,657,-88,336,31,192,814,657,299,-7,-4,-12,5,-6,-10,-3,-3,0,-2,0,1329,1329,1329,1329,1329,1329,1329,1329,1330,1329,1329,1329,11.677232736,11.951740522,11.167130312,12.090071029,11.264137475,12.284820031,11.310158342,11.36121565,10.928542669,10.829202029,9.5662455826,9.7157801572,9.753067657,9.7377637311,10.019843219,9.4940010433,10.621148696,11.19337951,9.9571166542,10.372166539,2.1109871537,2.2359603649,1.4140626549,2.3523072981,1.2442942559,2.790818988,0.6890096461,0.1678361403,0.971426015,0.4570354901,-0.013360678,0.3593507729,0.4493283202,0.4073828282,0.1702718456,0.4825247783,0.4550063701,0.8133597568,0.8308248813,0.6474669443,1.7101668081,1.5172588191,8.2332806914,-1.563824405,4.2306004702,-0.078247261,2.0410285744,9.6957647196,7.5668973803,3.1484667094,1.6968061299,1.876609592,8.6826090117,-1.156441577,4.4008723158,0.404277517,2.4960349445,10.509124476,8.3977222616,3.7959336537 +050,2,3,18,045,Indiana,Fountain County,17240,17242,17280,17161,17123,16886,16697,16543,16464,16442,16439,16425,16511,38,-119,-38,-237,-189,-154,-79,-22,-3,-14,86,57,184,177,193,207,203,173,160,205,202,200,26,199,199,213,197,212,205,197,220,194,193,31,-15,-22,-20,10,-9,-32,-37,-15,8,7,-1,-3,1,0,1,3,12,6,11,7,5,10,-101,-15,-221,-205,-148,-58,9,3,-30,74,9,-104,-14,-221,-204,-145,-46,15,14,-23,79,-2,0,-2,4,5,0,-1,0,-2,1,0,172,172,172,172,172,172,172,172,172,172,172,172,10.684939462,10.325516276,11.349936781,12.327665783,12.214199759,10.482624898,9.7246702729,12.469207141,12.29308666,12.144765606,11.555994309,11.608913779,12.526096033,11.732126373,12.755716005,12.421607538,11.973500274,13.381588151,11.806231743,11.71969881,-0.871054847,-1.283397503,-1.176159252,0.5955394098,-0.541516245,-1.93898264,-2.248830001,-0.91238101,0.4868549172,0.4250667962,-0.174210969,0.0583362501,0,0.059553941,0.1805054152,0.72711849,0.3646751352,0.6690794076,0.4259980526,0.3036191402,-5.865102639,-0.875043752,-12.99655973,-12.2085579,-8.904933815,-3.514406035,0.5470127029,0.1824762021,-1.82570594,4.4935632742,-6.039313609,-0.816707502,-12.99655973,-12.14900396,-8.7244284,-2.787287545,0.9116878381,0.8515556096,-1.399707887,4.7971824144 +050,2,3,18,047,Indiana,Franklin County,23087,23097,23058,23041,23036,22980,22993,22953,22774,22702,22752,22763,22761,-39,-17,-5,-56,13,-40,-179,-72,50,11,-2,64,249,238,257,240,246,240,250,307,249,264,60,195,216,222,210,217,203,199,219,216,231,4,54,22,35,30,29,37,51,88,33,33,3,13,10,13,25,4,2,3,8,3,4,-47,-85,-37,-104,-41,-73,-218,-126,-46,-24,-39,-44,-72,-27,-91,-16,-69,-216,-123,-38,-21,-35,1,1,0,0,-1,0,0,0,0,-1,0,187,187,187,187,187,187,187,187,187,187,187,187,10.802837372,10.330533672,11.170027816,10.440910969,10.708222696,10.497080499,10.994810449,13.508162098,10.941447874,11.598277831,8.4600533634,9.3756103913,9.6488178025,9.1357970983,9.4458712402,8.8787805891,8.7518691178,9.6361156334,9.4913764693,10.148493103,2.3427840083,0.9549232806,1.5212100139,1.3051138712,1.2623514561,1.6182999103,2.2429413317,3.8720464646,1.450071405,1.4497847289,0.5640035576,0.4340560366,0.5650208623,1.0875948927,0.1741174422,0.0874756708,0.1319377254,0.3520042241,0.1318246732,0.1757314823,-3.687715569,-1.606007336,-4.520166898,-1.783655624,-3.17764332,-9.53484812,-5.541384467,-2.024024288,-1.054597385,-1.713381952,-3.123712011,-1.171951299,-3.955146036,-0.696060731,-3.003525878,-9.44737245,-5.409446741,-1.672020064,-0.922772712,-1.53765047 +050,2,3,18,049,Indiana,Fulton County,20836,20856,20818,20734,20639,20455,20522,20346,20150,20022,20113,20042,20018,-38,-84,-95,-184,67,-176,-196,-128,91,-71,-24,54,256,239,256,267,265,264,213,243,240,241,82,271,230,235,223,239,246,224,250,237,224,-28,-15,9,21,44,26,18,-11,-7,3,17,5,2,-2,0,-3,1,8,7,11,8,7,-14,-70,-101,-209,33,-205,-222,-124,88,-83,-47,-9,-68,-103,-209,30,-204,-214,-117,99,-75,-40,-1,-1,-1,4,-7,2,0,0,-1,1,-1,224,224,224,224,224,224,224,224,224,224,224,224,12.321909896,11.553428565,12.459239792,13.03170071,12.968581775,13.038324773,10.604401075,12.109131681,11.953679492,12.031952072,13.043896804,11.118362217,11.437192778,10.884154526,11.69619262,12.149348084,11.152046201,12.457954404,11.804258498,11.183225162,-0.721986908,0.4350663476,1.0220470142,2.1475461844,1.2723891553,0.8889766891,-0.547645126,-0.348822723,0.1494209936,0.8487269096,0.0962649211,-0.096681411,0,-0.146423603,0.0489380444,0.3951007507,0.3485014438,0.5481499938,0.3984559831,0.3494757863,-3.369272237,-4.882411234,-10.17180124,1.6106596383,-10.03229911,-10.96404583,-6.173454147,4.3851999502,-4.133980824,-2.34648028,-3.273007316,-4.979092645,-10.17180124,1.4642360348,-9.983361065,-10.56894508,-5.824952703,4.9333499439,-3.735524841,-1.997004493 +050,2,3,18,051,Indiana,Gibson County,33503,33503,33545,33525,33533,33491,33733,33656,33669,33730,33622,33709,33825,42,-20,8,-42,242,-77,13,61,-108,87,116,108,427,413,408,422,405,419,403,439,390,412,97,325,332,361,347,381,373,383,415,367,412,11,102,81,47,75,24,46,20,24,23,0,0,1,3,4,3,24,57,45,66,53,37,33,-123,-70,-87,168,-123,-89,-2,-196,10,77,33,-122,-67,-83,171,-99,-32,43,-130,63,114,-2,0,-6,-6,-4,-2,-1,-2,-2,1,2,738,738,738,738,738,738,738,738,738,738,738,738,12.732965558,12.31769513,12.174743376,12.555039867,12.019765837,12.447085035,11.958634401,13.035990023,11.584559861,12.201261587,9.6913672283,9.901875988,10.772260683,10.323693919,11.307483417,11.08057928,11.365153786,12.323316308,10.901367869,12.201261587,3.0415983301,2.4158191416,1.4024826928,2.2313459479,0.71228242,1.3665057557,0.5934806154,0.7126737142,0.6831919918,0,0.0298195915,0.089474783,0.1193602292,0.0892538379,0.71228242,1.6932788711,1.3353313847,1.9598527141,1.5743119811,1.0957443658,-3.667809751,-2.087744937,-2.596084984,4.9982149232,-3.650447402,-2.643891571,-0.059348062,-5.820168666,0.2970399964,2.2803328694,-3.63799016,-1.998270154,-2.476724755,5.0874687612,-2.938164982,-0.9506127,1.2759833232,-3.860315952,1.8713519775,3.3760772352 +050,2,3,18,053,Indiana,Grant County,70061,70063,69906,69633,69110,68887,68381,67543,66731,66373,66112,65836,65225,-157,-273,-523,-223,-506,-838,-812,-358,-261,-276,-611,171,784,742,812,772,770,722,709,821,769,765,251,827,719,802,833,835,818,833,849,868,873,-80,-43,23,10,-61,-65,-96,-124,-28,-99,-108,5,26,30,22,26,22,31,21,35,14,14,-79,-254,-584,-250,-470,-802,-750,-253,-266,-191,-517,-74,-228,-554,-228,-444,-780,-719,-232,-231,-177,-503,-3,-2,8,-5,-1,7,3,-2,-2,0,0,5024,5024,5092,4958,4970,4937,4899,4803,4817,4784,4797,4798,11.237001842,10.696035115,11.768371776,11.24806947,11.329860805,10.754129616,10.653323717,12.393855908,11.656106951,11.67395335,11.853316994,10.364486857,11.623441089,12.136841799,12.286277626,12.184041587,12.516528429,12.816545269,13.156698093,13.322040882,-0.616315152,0.3315482583,0.1449306869,-0.888772329,-0.956416821,-1.429911971,-1.863204712,-0.422689361,-1.500591142,-1.648087532,0.3726556733,0.4324542499,0.3188475112,0.3788209925,0.3237103087,0.4617424073,0.3155427335,0.5283617013,0.212204808,0.2136409763,-3.64055927,-8.418442732,-3.623267172,-6.847917942,-11.80071216,-11.17118727,-3.801538646,-4.01554893,-2.89507988,-7.889456055,-3.267903597,-7.985988482,-3.304419661,-6.469096949,-11.47700185,-10.70944487,-3.485995913,-3.487187229,-2.682875072,-7.675815078 +050,2,3,18,055,Indiana,Greene County,33165,33172,33205,33034,32947,32746,32654,32428,32231,32194,32124,32117,32203,33,-171,-87,-201,-92,-226,-197,-37,-70,-7,86,75,357,356,336,331,341,319,348,337,388,360,98,341,375,382,408,375,370,423,390,406,443,-23,16,-19,-46,-77,-34,-51,-75,-53,-18,-83,1,4,9,2,8,3,9,12,18,23,18,57,-192,-70,-159,-14,-194,-153,27,-35,-11,152,58,-188,-61,-157,-6,-191,-144,39,-17,12,170,-2,1,-7,2,-9,-1,-2,-1,0,-1,-1,281,281,281,281,281,281,281,281,281,281,281,281,10.779148236,10.790985284,10.229400393,10.122324159,10.47908792,9.8671491981,10.803259604,10.479181567,12.079513084,11.194029851,10.296049155,11.366908656,11.629854018,12.47706422,11.523923666,11.44465581,13.131548312,12.127242763,12.639902866,13.774875622,0.4830990806,-0.575923372,-1.400453625,-2.354740061,-1.044835746,-1.577506612,-2.328288708,-1.648061196,-0.560389782,-2.580845771,0.1207747702,0.2728058077,0.0608892881,0.244648318,0.0921913893,0.2783835197,0.3725261932,0.5597188967,0.7160536106,0.5597014925,-5.797188967,-2.121822949,-4.8406984,-0.428134557,-5.961709843,-4.732519835,0.8381839348,-1.088342299,-0.342460422,4.7263681592,-5.676414197,-1.849017141,-4.779809112,-0.183486239,-5.869518454,-4.454136315,1.2107101281,-0.528623402,0.3735931882,5.2860696517 +050,2,3,18,057,Indiana,Hamilton County,274569,274555,276499,283405,289821,296970,302921,308623,316221,323225,330635,337955,344238,1944,6906,6416,7149,5951,5702,7598,7004,7410,7320,6283,1008,3840,3813,3697,4015,3830,3932,3806,3842,3738,3760,348,1267,1391,1432,1485,1600,1561,1799,1858,1918,2124,660,2573,2422,2265,2530,2230,2371,2007,1984,1820,1636,196,673,723,641,639,529,842,522,892,588,475,1011,3641,3220,4186,2780,2943,4376,4467,4537,4926,4173,1207,4314,3943,4827,3419,3472,5218,4989,5429,5514,4648,77,19,51,57,2,0,9,8,-3,-14,-1,1628,1628,1627,1628,1629,1629,1631,1869,1871,1868,1869,1871,13.716637138,13.303653358,12.600738593,13.385765081,12.525672723,12.585541351,11.904054447,11.751751139,11.181740678,11.023273472,4.5257758473,4.853234152,4.8807837884,4.9508994134,5.2326570124,4.9964471132,5.6267456517,5.6831737681,5.7374474641,6.2269768233,9.1908612905,8.4504192064,7.719954805,8.4348656673,7.2930157111,7.5890942379,6.2773087954,6.0685773713,5.4442932141,4.7962966492,2.40398354,2.5225652709,2.1847642517,2.1303870203,1.7300472247,2.6950726901,1.6326632741,2.7284128101,1.7589254999,1.3925677924,13.005800994,11.234661373,14.267430823,9.268350417,9.6248184922,14.006696071,13.971469053,13.877588475,14.735488117,12.234074521,15.409784534,13.757226644,16.452195075,11.398737437,11.354865717,16.701768761,15.604132327,16.606001285,16.494413617,13.626642314 +050,2,3,18,059,Indiana,Hancock County,70002,70060,70246,70373,70594,71000,71773,72441,73790,75040,76521,78159,79553,186,127,221,406,773,668,1349,1250,1481,1638,1394,203,783,745,778,753,785,800,813,818,789,802,117,620,608,615,582,619,699,657,666,654,700,86,163,137,163,171,166,101,156,152,135,102,1,-7,0,-3,-9,6,26,25,41,12,16,103,-28,101,258,607,500,1220,1071,1291,1494,1281,104,-35,101,255,598,506,1246,1096,1332,1506,1297,-4,-1,-17,-12,4,-4,2,-2,-3,-3,-5,649,649,649,649,649,649,649,649,649,649,649,649,11.136475156,10.569849681,10.989166208,10.548212897,10.886599082,10.941592412,10.92521669,10.794333635,10.201706749,10.170437253,8.818154019,8.6261323572,8.6868087631,8.1528020004,8.5844647538,9.56021637,8.8288651482,8.7885405876,8.4561675718,8.8769402455,2.3183211373,1.9437173239,2.3023574445,2.395410897,2.3021343282,1.381376042,2.096351542,2.005793047,1.7455391777,1.2934970072,-0.099559803,0,-0.042374677,-0.126074258,0.0832096745,0.3556017534,0.3359537728,0.5410362824,0.155159038,0.2029014913,-0.398239214,1.432959487,3.6442222128,8.5030082719,6.9341395426,16.685928428,14.392259625,17.036044893,19.317300233,16.244800649,-0.497799017,1.432959487,3.6018475359,8.3769340141,7.0173492171,17.041530182,14.728213398,17.577081175,19.472459271,16.447702141 +050,2,3,18,061,Indiana,Harrison County,39364,39363,39328,39187,39014,39002,39175,39537,39669,39797,40258,40552,40682,-35,-141,-173,-12,173,362,132,128,461,294,130,95,401,415,414,398,472,452,454,432,411,414,119,369,363,385,389,380,400,441,409,365,395,-24,32,52,29,9,92,52,13,23,46,19,4,16,15,12,13,20,25,13,22,15,13,-10,-189,-241,-52,157,253,59,104,417,235,97,-6,-173,-226,-40,170,273,84,117,439,250,110,-5,0,1,-1,-6,-3,-4,-2,-1,-2,1,461,461,461,461,461,461,461,461,461,461,461,461,10.214608674,10.613675017,10.613207547,10.182022846,11.993088729,11.413276772,11.426270355,10.792580101,10.172008415,10.192776424,9.3994778068,9.2837687498,9.8697703035,9.9517760978,9.6554527899,10.100244931,11.099086402,10.217975142,9.0335354535,9.7249919984,0.8151308667,1.3299062672,0.7434372436,0.2302467478,2.3376359386,1.313031841,0.3271839529,0.5746049591,1.1384729613,0.4677844252,0.4075654334,0.3836268078,0.3076292043,0.3325786357,0.5081817258,0.6312653082,0.3271839529,0.5496221348,0.371241183,0.3200630278,-4.814366682,-6.163604046,-1.333059885,4.0165265999,6.4284988312,1.4897861273,2.6174716231,10.417837737,5.8161118673,2.388162592,-4.406801248,-5.779977238,-1.025430681,4.3491052356,6.936680557,2.1210514355,2.944655576,10.967459871,6.1873530504,2.7082256198 +050,2,3,18,063,Indiana,Hendricks County,145448,145455,145954,148678,150761,153596,155906,157848,160459,163637,166759,169924,173251,499,2724,2083,2835,2310,1942,2611,3178,3122,3165,3327,434,1777,1749,1641,1811,1725,1805,1716,1694,1625,1647,209,988,965,1056,1046,1110,1122,1216,1274,1188,1262,225,789,784,585,765,615,683,500,420,437,385,89,272,331,181,203,159,234,159,272,174,151,188,1656,977,2042,1354,1179,1698,2518,2432,2563,2802,277,1928,1308,2223,1557,1338,1932,2677,2704,2737,2953,-3,7,-9,27,-12,-11,-4,1,-2,-9,-11,3360,3361,3751,3831,4176,4208,4108,3887,4006,4051,4070,4067,12.062505091,11.68184505,10.783389244,11.702670742,10.99587575,11.341252313,10.589454976,10.254361433,9.6529970328,9.5986012967,6.7066713731,6.4453862055,6.9392194035,6.7592454976,7.0756070042,7.0497978367,7.5039494471,7.7119577719,7.0570833692,7.3548481096,5.355833718,5.2364588447,3.84416984,4.9434252444,3.9202687456,4.2914544763,3.0855055292,2.5424036611,2.5959136636,2.2437531871,1.8463710663,2.2108008643,1.1893927197,1.3117847381,1.0135328952,1.4702786932,0.9811907583,1.6465090376,1.0336132207,0.8800174838,11.241141492,6.5255360858,13.418452672,8.7495395829,7.5154420342,10.668945389,15.538605845,14.721727866,15.225003935,16.329860858,13.087512558,8.7363369501,14.607845392,10.061324321,8.5289749294,12.139224082,16.519796603,16.368236904,16.258617156,17.209878342 +050,2,3,18,065,Indiana,Henry County,49462,49466,49530,49221,49118,48847,48887,48662,48349,48178,48205,48025,48033,64,-309,-103,-271,40,-225,-313,-171,27,-180,8,129,439,469,484,503,465,472,468,481,481,480,100,550,589,578,579,576,588,650,580,600,577,29,-111,-120,-94,-76,-111,-116,-182,-99,-119,-97,1,0,6,3,6,5,6,3,4,3,2,36,-198,17,-178,122,-116,-202,12,123,-63,102,37,-198,23,-175,128,-111,-196,15,127,-60,104,-2,0,-6,-2,-12,-3,-1,-4,-1,-1,1,3016,3016,3090,3562,3591,3650,3633,3604,3506,3551,3563,3557,8.8910492046,9.5384333784,9.8810799775,10.29324493,9.533670258,9.7308552638,9.6967687797,9.9810132492,9.9968824691,9.9939619813,11.139127705,11.978970703,11.8001327,11.848486709,11.80944961,12.122336642,13.467734416,12.035317431,12.470123662,12.013575132,-2.2480785,-2.440537325,-1.919052723,-1.555241779,-2.275779352,-2.391481378,-3.770965637,-2.054304182,-2.473241193,-2.01961315,0,0.1220268662,0.0612463635,0.1227822457,0.1025125834,0.1236973127,0.0621587742,0.0830021892,0.0623506183,0.0416415083,-4.010085974,0.3457427877,-3.633950901,2.496572329,-2.378291935,-4.164476193,0.2486350969,2.5523173174,-1.309362985,2.123716921,-4.010085974,0.467769654,-3.572704537,2.6193545747,-2.275779352,-4.040778881,0.3107938711,2.6353195066,-1.247012366,2.1653584293 +050,2,3,18,067,Indiana,Howard County,82752,82748,82753,82805,82853,82761,82633,82378,82395,82302,82339,82660,82732,5,52,48,-92,-128,-255,17,-93,37,321,72,226,998,986,1054,949,988,1013,953,1024,979,995,173,865,894,987,942,1075,1014,1065,1080,998,1016,53,133,92,67,7,-87,-1,-112,-56,-19,-21,24,88,61,28,40,19,56,48,79,57,46,-68,-165,-92,-178,-166,-179,-34,-24,18,285,43,-44,-77,-31,-150,-126,-160,22,24,97,342,89,-4,-4,-13,-9,-9,-8,-4,-5,-4,-2,4,1282,1282,1282,1281,1281,1281,1281,1280,1281,1281,1281,1281,12.056197828,11.90404327,12.728392527,11.475627895,11.974959245,12.295703786,11.57276696,12.439185865,11.866738586,12.032020896,10.449510141,10.79332118,11.919282186,11.390981535,13.029434401,12.307841697,12.932840307,13.119453842,12.097043012,12.285963045,1.6066876865,1.1107220901,0.8091103409,0.0846463596,-1.054475156,-0.012137911,-1.360073347,-0.680267977,-0.230304426,-0.25394215,1.063071552,0.736457038,0.3381356649,0.4836934834,0.2302876778,0.6797230129,0.5828885772,0.9596637533,0.6909132783,0.5562542324,-1.99325916,-1.11072209,-2.149576727,-2.007327956,-2.169552333,-0.412688972,-0.291444289,0.218657564,3.4545663913,0.5199767824,-0.930187608,-0.374265052,-1.811441062,-1.523634473,-1.939264655,0.2670340408,0.2914442886,1.1783213173,4.1454796696,1.0762310148 +050,2,3,18,069,Indiana,Huntington County,37124,37123,37115,37169,36983,36786,36624,36535,36313,36253,36249,36544,36395,-8,54,-186,-197,-162,-89,-222,-60,-4,295,-149,120,390,429,415,424,444,414,433,412,431,419,102,381,416,418,425,387,463,426,388,379,420,18,9,13,-3,-1,57,-49,7,24,52,-1,3,13,10,13,19,7,27,13,23,16,10,-29,34,-211,-208,-176,-151,-200,-80,-50,228,-159,-26,47,-201,-195,-157,-144,-173,-67,-27,244,-149,0,-2,2,1,-4,-2,0,0,-1,-1,1,1330,1330,1330,1330,1330,1332,1334,1336,1337,1338,1339,1339,10.500242313,11.570827489,11.251338638,11.551559733,12.137946117,11.366132221,11.933963564,11.365203719,11.841797975,11.489052496,10.257929029,11.220196353,11.332673616,11.578803978,10.579696278,12.711399078,11.741035747,10.703153016,10.413089171,11.516472669,0.2423132842,0.350631136,-0.081334978,-0.027244245,1.5582498394,-1.345266857,0.1929278174,0.662050702,1.4287088044,-0.027420173,0.3500080771,0.2697162585,0.3524515718,0.5176406484,0.1913640154,0.7412694926,0.3582945181,0.6344652561,0.4396027091,0.2742017302,0.9154057401,-5.691013054,-5.639225149,-4.794987059,-4.127995189,-5.490885131,-2.204889342,-1.379272296,6.264338604,-4.35980751,1.2654138172,-5.421296796,-5.286773577,-4.277346411,-3.936631173,-4.749615638,-1.846594824,-0.74480704,6.703941313,-4.08560578 +050,2,3,18,071,Indiana,Jackson County,42376,42376,42584,42922,42996,43450,43719,43892,43991,43942,44049,44179,44222,208,338,74,454,269,173,99,-49,107,130,43,127,580,522,600,598,618,594,623,623,581,606,86,448,447,430,491,495,437,496,499,459,484,41,132,75,170,107,123,157,127,124,122,122,17,61,96,70,84,81,121,88,139,76,68,140,147,-88,218,87,-27,-179,-264,-155,-69,-149,157,208,8,288,171,54,-58,-176,-16,7,-81,10,-2,-9,-4,-9,-4,0,0,-1,1,2,595,595,595,595,595,595,595,595,595,595,595,595,13.566299441,12.151120836,13.881498276,13.720474022,14.107817511,13.517972759,14.16987934,14.160539146,13.170422088,13.710252146,10.47879681,10.405270141,9.9484070981,11.265472817,11.299950919,9.9450405653,11.281316457,11.342069075,10.404860135,10.950102374,3.0875026314,1.7458506948,3.9330911783,2.4550012046,2.8078665921,3.5729321939,2.8885628831,2.8184700708,2.7655619531,2.7601497721,1.4268004584,2.2346888894,1.6195081322,1.9272906653,1.8490828777,2.7536611176,2.0015238875,3.159414031,1.7228090856,1.5384441352,3.4383552031,-2.048464815,5.0436110404,1.9961224747,-0.616360959,-4.073597852,-6.004571663,-3.523087589,-1.564129301,-3.37100259,4.8651556616,0.1862240741,6.6631191727,3.92341314,1.2327219185,-1.319936734,-4.003047775,-0.363673558,0.1586797842,-1.832558455 +050,2,3,18,073,Indiana,Jasper County,33478,33481,33497,33429,33498,33432,33523,33498,33414,33439,33356,33516,33440,16,-68,69,-66,91,-25,-84,25,-83,160,-76,112,373,402,405,344,401,377,384,357,368,359,111,274,303,346,293,361,313,347,307,353,365,1,99,99,59,51,40,64,37,50,15,-6,0,3,11,5,22,1,6,0,2,1,1,18,-171,-37,-132,25,-66,-152,-10,-137,145,-72,18,-168,-26,-127,47,-65,-146,-10,-135,146,-71,-3,1,-4,2,-7,0,-2,-2,2,-1,1,926,926,926,926,926,926,927,929,932,932,932,932,11.146639572,12.013088888,12.102196325,10.275558211,11.966398591,11.268531803,11.487891344,10.689422861,11.006101208,10.723460183,8.1881481039,9.0546416245,10.339160317,8.7521469644,10.772742872,9.3555714969,10.380985147,9.1923048132,10.557482953,10.902682359,2.9584914682,2.9584472634,1.7630360078,1.5234112464,1.1936557198,1.9129603061,1.1069061972,1.4971180478,0.4486182558,-0.179222176,0.0896512566,0.3287163626,0.1494098312,0.6571577925,0.029841393,0.1793400287,0,0.0598847219,0.0299078837,0.0298703626,-5.110121627,-1.105682311,-3.944419543,0.7467702188,-1.969531938,-4.543280727,-0.299163837,-4.102103451,4.3366431391,-2.150666109,-5.02047037,-0.776965948,-3.795009712,1.4039280114,-1.939690545,-4.363940698,-0.299163837,-4.042218729,4.3665510228,-2.120795746 +050,2,3,18,075,Indiana,Jay County,21253,21253,21179,21336,21346,21267,21135,21135,21021,20879,20721,20446,20416,-74,157,10,-79,-132,0,-114,-142,-158,-275,-30,65,326,286,291,311,331,303,288,304,286,288,68,201,223,237,250,246,226,249,260,203,243,-3,125,63,54,61,85,77,39,44,83,45,-1,2,2,4,1,-1,-4,-8,-10,-11,-6,-73,29,-51,-136,-196,-85,-187,-174,-192,-347,-70,-74,31,-49,-132,-195,-86,-191,-182,-202,-358,-76,3,1,-4,-1,2,1,0,1,0,0,1,243,243,243,243,243,243,243,243,243,243,243,243,15.335763848,13.40143386,13.657803957,14.669119381,15.661225455,14.375177911,13.747016706,14.615384615,13.894624335,14.096226323,9.455486299,10.449369758,11.123366109,11.791896609,11.63946061,10.722079894,11.885441527,12.5,9.8622683217,11.89369096,5.8802775491,2.952064102,2.5344378476,2.8772227725,4.021764845,3.6530980169,1.861575179,2.1153846154,4.0323560133,2.2025353629,0.0940844408,0.0937163207,0.1877361369,0.0471675864,-0.047314881,-0.189771326,-0.381861575,-0.480769231,-0.534408628,-0.293671382,1.3642243914,-2.389766178,-6.383028653,-9.244846941,-4.021764845,-8.87180947,-8.30548926,-9.230769231,-16.85816309,-3.42616612,1.4583088322,-2.296049857,-6.195292516,-9.197679355,-4.069079726,-9.061580795,-8.687350835,-9.711538462,-17.39257172,-3.719837502 +050,2,3,18,077,Indiana,Jefferson County,32428,32400,32399,32273,32442,32399,32412,32305,32259,32031,32169,32265,32110,-1,-126,169,-43,13,-107,-46,-228,138,96,-155,92,330,372,353,355,368,395,376,380,360,367,100,366,340,384,394,372,375,392,384,379,378,-8,-36,32,-31,-39,-4,20,-16,-4,-19,-11,0,6,15,8,17,9,22,17,28,19,17,8,-95,129,-15,39,-110,-88,-228,114,97,-163,8,-89,144,-7,56,-101,-66,-211,142,116,-146,-1,-1,-7,-5,-4,-2,0,-1,0,-1,2,1905,1980,1993,1991,1973,2056,2024,1946,1911,2065,2044,2044,10.205343889,11.496561848,10.888172607,10.95493049,11.372591437,12.235920947,11.696997978,11.838006231,11.174224788,11.401941748,11.318654132,10.507610291,11.844357737,12.158429896,11.496206561,11.616380646,12.194742573,11.962616822,11.763975541,11.74368932,-1.113310242,0.9889515568,-0.95618513,-1.203499406,-0.123615124,0.6195403011,-0.497744595,-0.124610592,-0.589750753,-0.341747573,0.1855517071,0.4635710423,0.2467574528,0.5246023052,0.2781340297,0.6814943312,0.528853632,0.8722741433,0.5897507527,0.5281553398,-2.937902029,3.9867109635,-0.462670224,1.203499406,-3.399415919,-2.725977325,-7.092860476,3.5514018692,3.0108327901,-5.06407767,-2.752350322,4.4502820057,-0.215912771,1.7281017111,-3.121281889,-2.044482994,-6.564006844,4.4236760125,3.6005835429,-4.53592233 +050,2,3,18,079,Indiana,Jennings County,28525,28529,28482,28154,28150,28238,27930,27847,27682,27686,27650,27662,27515,-47,-328,-4,88,-308,-83,-165,4,-36,12,-147,94,343,321,363,337,347,324,313,338,313,313,83,294,239,287,285,297,284,321,321,302,342,11,49,82,76,52,50,40,-8,17,11,-29,2,3,5,-1,-1,-1,9,3,6,7,7,-63,-382,-90,17,-362,-129,-214,10,-60,-4,-127,-61,-379,-85,16,-363,-130,-205,13,-54,3,-120,3,2,-1,-4,3,-3,0,-1,1,-2,2,298,298,298,298,298,298,298,298,298,298,298,298,12.112437319,11.402387042,12.875079804,11.99971514,12.442404575,11.669578058,11.306169629,12.216278734,11.31761643,11.345306921,10.382089131,8.4896277352,10.179470809,10.148127047,10.64955089,10.228889409,11.59514521,11.601850513,10.919872722,12.396469543,1.7303481884,2.9127593066,2.6956089948,1.8515880929,1.7928536852,1.4406886492,-0.288975582,0.6144282203,0.3977437084,-1.051162622,0.105939685,0.1776072748,-0.035468539,-0.035607463,-0.035857074,0.3241549461,0.1083658431,0.2168570189,0.2531096326,0.2537289088,-13.48965322,-3.196930946,0.6029651699,-12.88990172,-4.625562508,-7.707684273,0.361219477,-2.168570189,-0.144634076,-4.603367345,-13.38371354,-3.019323671,0.5674966305,-12.92550919,-4.661419582,-7.383529327,0.46958532,-1.95171317,0.1084755568,-4.349638436 +050,2,3,18,081,Indiana,Johnson County,139654,139856,140269,141747,143502,145448,147129,149021,151621,153879,156301,158332,160607,413,1478,1755,1946,1681,1892,2600,2258,2422,2031,2275,443,1842,1827,1802,1889,1800,1906,1862,1843,1864,1857,244,1192,1254,1195,1183,1317,1350,1318,1374,1365,1409,199,650,573,607,706,483,556,544,469,499,448,59,208,217,167,232,224,318,224,334,207,180,160,624,970,1171,762,1187,1726,1492,1623,1328,1648,219,832,1187,1338,994,1411,2044,1716,1957,1535,1828,-5,-4,-5,1,-19,-2,0,-2,-4,-3,-1,2547,2547,2407,2471,2493,2552,2525,2464,2431,2414,2416,2418,13.063088619,12.809860858,12.47274615,12.912840039,12.156002026,12.679532467,12.1898527,11.883422529,11.84872534,11.644859989,8.4534210825,8.7923182903,8.2713272192,8.0867600666,8.8941414824,8.9807811284,8.6284779051,8.8593719776,8.6767757991,8.8355453551,4.6096675366,4.0175425681,4.2014189306,4.8260799721,3.2618605436,3.6987513388,3.5613747954,3.0240505513,3.1719495412,2.8093146338,1.4750936117,1.5214777265,1.1559093269,1.5859072996,1.5127469188,2.115472888,1.4664484452,2.1535882391,1.3158187476,1.1287424868,4.4252808351,6.8010755515,8.1052085136,5.2088851824,8.0162080027,11.482094983,9.767594108,10.464891353,8.4415811437,10.334264546,5.9003744468,8.322553278,9.2611178405,6.794792482,9.5289549215,13.597567871,11.234042553,12.618479592,9.7573998913,11.463007033 +050,2,3,18,083,Indiana,Knox County,38440,38440,38394,38479,37986,38070,37979,37784,37367,37070,36602,36603,36522,-46,85,-493,84,-91,-195,-417,-297,-468,1,-81,108,490,449,490,499,439,453,411,427,396,398,121,483,439,417,453,474,456,422,448,396,422,-13,7,10,73,46,-35,-3,-11,-21,0,-24,8,23,18,7,8,9,17,12,20,13,12,-38,57,-537,12,-139,-167,-433,-300,-469,-14,-70,-30,80,-519,19,-131,-158,-416,-288,-449,-1,-58,-3,-2,16,-8,-6,-2,2,2,2,2,1,2645,2645,2667,2512,2633,2726,2558,2346,2118,1879,1873,1882,12.748299143,11.743935134,12.885242453,13.12311799,11.588770244,12.055727801,11.042895334,11.591920947,10.818933133,10.885470085,12.566180584,11.482377558,10.965604292,11.913371642,12.51270409,12.135567058,11.338447278,12.16201542,10.818933133,11.541880342,0.1821185592,0.2615575754,1.9196381614,1.2097463477,-0.923933846,-0.079839257,-0.295551943,-0.570094473,0,-0.656410256,0.5983895516,0.4708036357,0.1840748922,0.2103906692,0.2375829891,0.4524224561,0.3224203017,0.542947117,0.3551669968,0.3282051282,1.4829654105,-14.0456418,0.315556958,-3.655537877,-4.408484353,-11.52346609,-8.060507543,-12.73210989,-0.382487535,-1.914529915,2.0813549621,-13.57483816,0.4996318502,-3.445147208,-4.170901363,-11.07104363,-7.738087242,-12.18916278,-0.027320538,-1.586324786 +050,2,3,18,085,Indiana,Kosciusko County,77358,77355,77338,77349,77605,77873,78384,78562,78764,79121,79467,79438,78988,-17,11,256,268,511,178,202,357,346,-29,-450,252,996,961,1043,1060,1111,987,1043,1040,995,991,157,650,650,760,691,705,715,661,756,731,786,95,346,311,283,369,406,272,382,284,264,205,14,30,48,35,40,39,132,81,141,103,83,-125,-364,-93,-35,115,-260,-200,-100,-75,-397,-736,-111,-334,-45,0,155,-221,-68,-19,66,-294,-653,-1,-1,-10,-15,-13,-7,-2,-6,-4,1,-2,1568,1568,1568,1568,1568,1570,1571,1573,1573,1575,1574,1574,12.877617382,12.403681092,13.416689178,13.567392181,14.157735782,12.547194996,13.212148082,13.115746463,12.523205689,12.51057276,8.4040675687,8.389586587,9.7763027567,8.8444037707,8.9839817517,9.0894067096,8.373183013,9.5341387747,9.200465687,9.9226137124,4.4735498135,4.0140945055,3.6403864212,4.7229884101,5.17375403,3.4577882867,4.8389650695,3.5816076878,3.3227400019,2.5879590471,0.3878800416,0.6195387018,0.4502244691,0.5119770634,0.4969862246,1.6780443156,1.0260632739,1.7781925492,1.2963720462,1.0478078093,-4.706277838,-1.200356235,-0.450224469,1.4719340574,-3.313241497,-2.542491387,-1.266744783,-0.945847101,-4.996696139,-9.291404189,-4.318397797,-0.580817533,0,1.9839111208,-2.816255273,-0.864447072,-0.240681509,0.8323454486,-3.700324093,-8.243596379 +050,2,3,18,087,Indiana,LaGrange County,37128,37131,37159,37470,37663,38089,38436,38620,39122,39247,39425,39771,40119,28,311,193,426,347,184,502,125,178,346,348,196,755,731,745,751,728,751,752,747,783,781,86,253,263,247,265,265,236,284,296,275,283,110,502,468,498,486,463,515,468,451,508,498,3,14,25,8,-1,-1,-2,-5,-1,-3,-1,-88,-205,-305,-76,-134,-278,-9,-339,-273,-159,-152,-85,-191,-280,-68,-135,-279,-11,-344,-274,-162,-153,3,0,5,-4,-4,0,-2,1,1,0,3,324,324,324,324,325,325,325,325,325,325,325,325,20.233421324,19.458826348,19.669447671,19.627572689,18.895348837,19.320315917,19.191261851,18.99023795,19.773725946,19.55188384,6.7802060861,7.0009183714,6.5212799662,6.9258412284,6.8781146179,6.0713642561,7.2477637841,7.5249135652,6.9447951917,7.0847415196,13.453215238,12.457907977,13.148167705,12.70173146,12.017234219,13.248951661,11.943498067,11.465324385,12.828930754,12.467142321,0.3751892696,0.6654865372,0.2112155455,-0.02613525,-0.02595515,-0.051452239,-0.127601475,-0.025422005,-0.075761402,-0.025034422,-5.493842876,-8.118935754,-2.006547682,-3.502123489,-7.215531561,-0.231535078,-8.65138001,-6.940207444,-4.015354311,-3.805232194,-5.118653607,-7.453449217,-1.795332136,-3.528258739,-7.241486711,-0.282987317,-8.778981485,-6.965629449,-4.091115713,-3.830266617 +050,2,3,18,089,Indiana,Lake County,496005,496112,495972,495035,493511,491909,491259,488195,486381,484834,484918,486244,487536,-140,-937,-1524,-1602,-650,-3064,-1814,-1547,84,1326,1292,1594,6185,6133,6054,6076,5986,5814,5534,5712,5795,5722,1174,4528,4514,4755,4639,4899,4792,4977,5143,5040,5384,420,1657,1619,1299,1437,1087,1022,557,569,755,338,29,100,225,121,168,84,199,19,262,81,87,-575,-2693,-3394,-3025,-2233,-4249,-3033,-2121,-741,491,850,-546,-2593,-3169,-2904,-2065,-4165,-2834,-2102,-479,572,937,-14,-1,26,3,-22,14,-2,-2,-6,-1,17,6425,6425,6447,6426,6411,6528,6510,6478,6512,6487,6490,6490,12.4822529,12.408122637,12.287146597,12.360044265,12.223136564,11.93134245,11.396034864,11.780331466,11.934157226,11.752141141,9.1381796496,9.132604856,9.6507073126,9.4368409061,10.00353258,9.8340201277,10.249017983,10.606835562,10.379318795,11.057939165,3.3440732507,3.2755177807,2.6364392848,2.9232033589,2.2196039834,2.0973223227,1.1470168809,1.1734959041,1.5548384307,0.6942019758,0.2018149216,0.4552140214,0.2455805646,0.341752376,0.1715241349,0.4083827223,0.0391262491,0.5403443355,0.1668104806,0.1786851239,-5.434875838,-6.866650616,-6.139514116,-4.542458664,-8.676262489,-6.22424521,-4.367724963,-1.528225773,1.0111598271,1.7457741995,-5.233060917,-6.411436595,-5.893933551,-4.200706288,-8.504738354,-5.815862488,-4.328598714,-0.987881438,1.1779703077,1.9244593235 +050,2,3,18,091,Indiana,LaPorte County,111467,111466,111458,111328,111321,111452,111774,110884,110331,109958,110134,110044,109663,-8,-130,-7,131,322,-890,-553,-373,176,-90,-381,333,1326,1301,1322,1343,1319,1348,1269,1325,1217,1249,226,1136,1155,1157,1131,1263,1188,1312,1212,1208,1310,107,190,146,165,212,56,160,-43,113,9,-61,5,3,26,9,18,0,54,36,83,24,37,-120,-319,-166,-23,120,-951,-766,-364,-17,-124,-362,-115,-316,-140,-14,138,-951,-712,-328,66,-100,-325,0,-4,-13,-20,-28,5,-1,-2,-3,1,5,6623,6564,6678,6692,6804,6884,6522,6275,6223,6314,6386,6387,11.903800059,11.686555969,11.868583715,12.032648527,11.84776653,12.187238659,11.521228931,12.040419461,11.054692113,11.369687811,10.198127351,10.375074669,10.387255188,10.133228208,11.344752939,10.740682142,11.911625183,11.013576141,10.972940076,11.924972805,1.7056727083,1.3114813002,1.4813285272,1.8994203184,0.5030135903,1.4465565174,-0.390396252,1.0268433201,0.081752037,-0.555284993,0.0269316743,0.2335514644,0.0807997378,0.1612715365,0,0.4882128246,0.3268433739,0.7542300493,0.218005432,0.336812209,-2.863734705,-1.491136273,-0.206488219,1.0751435765,-8.54224865,-6.925389327,-3.30474967,-0.154480853,-1.126361399,-3.295297828,-2.836803031,-1.257584808,-0.125688481,1.2364151129,-8.54224865,-6.437176502,-2.977906296,0.5997491958,-0.908355967,-2.958485619 +050,2,3,18,093,Indiana,Lawrence County,46134,46134,46105,46144,46121,45900,45653,45571,45560,45595,45690,45419,45496,-29,39,-23,-221,-247,-82,-11,35,95,-271,77,114,479,474,495,451,510,477,508,503,526,514,147,500,553,548,568,563,522,590,540,580,603,-33,-21,-79,-53,-117,-53,-45,-82,-37,-54,-89,6,34,26,16,9,2,1,-1,0,-6,-1,4,29,40,-179,-132,-27,35,123,134,-211,168,10,63,66,-163,-123,-25,36,122,134,-217,167,-6,-3,-10,-5,-7,-4,-2,-5,-2,0,-1,653,653,653,653,653,653,653,653,653,653,653,653,10.384936422,10.274752073,10.75841384,9.8522167488,11.181268087,10.468446522,11.145850474,11.02043052,11.546609007,11.307265028,10.84022591,11.987210752,11.910324817,12.408113333,12.343243006,11.456035817,12.944983819,11.83107849,12.732002327,13.265137766,-0.455289488,-1.712458679,-1.151910977,-2.555896584,-1.161974919,-0.987589295,-1.799133344,-0.810647971,-1.18539332,-1.957872738,0.7371353619,0.5635939956,0.34774671,0.1966074296,0.0438481101,0.0219464288,-0.021940651,0,-0.131710369,-0.02199857,0.6287331028,0.8670676855,-3.890416318,-2.883575634,-0.591949487,0.7681250069,2.6987000165,2.935860218,-4.63181464,3.6957597756,1.3658684647,1.430661681,-3.542669608,-2.686968204,-0.548101377,0.7900714356,2.6767593659,2.935860218,-4.763525009,3.6737612055 +050,2,3,18,095,Indiana,Madison County,131636,131639,131621,131013,130216,130331,129773,129436,129360,129465,129509,129416,129681,-18,-608,-797,115,-558,-337,-76,105,44,-93,265,374,1631,1495,1500,1442,1514,1481,1469,1423,1385,1377,361,1503,1454,1535,1460,1504,1484,1534,1529,1519,1554,13,128,41,-35,-18,10,-3,-65,-106,-134,-177,21,71,96,33,51,38,70,34,62,49,40,-35,-805,-944,138,-577,-374,-136,146,92,-10,396,-14,-734,-848,171,-526,-336,-66,180,154,39,436,-17,-2,10,-21,-14,-11,-7,-10,-4,2,6,6277,6277,6211,6139,6132,5968,6051,5925,6000,6174,6214,6213,12.420326386,11.445896129,11.514237354,11.087872543,11.681693151,11.445308274,11.35129914,10.989520183,10.698078594,10.629223804,11.445585872,11.131995299,11.782902893,11.226278719,11.604535336,11.468492558,11.853569014,11.80813518,11.733127353,11.995507474,0.9747405134,0.3139008303,-0.268665538,-0.138406176,0.0771578147,-0.023184284,-0.502269873,-0.818614996,-1.035048759,-1.36628367,0.5406763785,0.73498731,0.2533132218,0.392150832,0.293199696,0.5409666301,0.26272578,0.4788125449,0.3784879791,0.3087646711,-6.13020401,-7.227375215,1.0593098366,-4.436686864,-2.885702271,-1.051020881,1.1281754081,0.7104960344,-0.077242445,3.0567702443,-5.589527632,-6.492387905,1.3126230584,-4.044536032,-2.592502575,-0.510054251,1.3909011881,1.1893085792,0.3012455344,3.3655349155 +050,2,3,18,097,Indiana,Marion County,903393,903373,904604,911294,919917,930127,936178,940152,946050,951247,959370,963829,966183,1231,6690,8623,10210,6051,3974,5898,5197,8123,4459,2354,3572,14531,14414,14611,14423,14593,14229,14208,14297,14004,13959,1859,7415,7579,7750,7672,7935,8021,8405,8365,8326,8808,1713,7116,6835,6861,6751,6658,6208,5803,5932,5678,5151,693,2650,3118,2609,2859,2607,4463,3275,5189,3899,3045,-1149,-3060,-1180,808,-3373,-5237,-4742,-3842,-2959,-5126,-5880,-456,-410,1938,3417,-514,-2630,-279,-567,2230,-1227,-2835,-26,-16,-150,-68,-186,-54,-31,-39,-39,8,38,16675,16730,16827,17116,17638,17616,17567,18232,17932,18294,18364,18370,16.004202879,15.742587828,15.795300004,15.456208926,15.554833105,15.08746147,14.977096364,14.965846111,14.563235526,14.465195035,8.1667582651,8.2775824304,8.3781791136,8.2215929336,8.4580004583,8.5049215301,8.8599728983,8.756333687,8.658490359,9.1274043892,7.8374446142,7.4650053981,7.4171208901,7.2346159926,7.0968326467,6.58253994,6.1171234656,6.2095124245,5.9047451668,5.3377906459,2.9186661365,3.4053967566,2.820473459,3.0638078985,2.778828884,4.7322609137,3.4522797432,5.4317531981,4.0547026075,3.1554207953,-3.37023335,-1.288764648,0.8734927386,-3.614628906,-5.582173711,-5.028093492,-4.049972145,-3.097428736,-5.330701607,-6.093226363,-0.451567214,2.1166321085,3.6939661976,-0.550821007,-2.803344827,-0.295832578,-0.597692401,2.3343244617,-1.275999,-2.937805568 +050,2,3,18,099,Indiana,Marshall County,47051,47050,47000,46944,46950,46921,46935,46746,46629,46434,46311,46197,46108,-50,-56,6,-29,14,-189,-117,-195,-123,-114,-89,150,544,653,569,546,581,638,566,570,526,525,111,425,432,469,469,456,485,477,446,483,507,39,119,221,100,77,125,153,89,124,43,18,13,29,29,20,22,32,40,29,52,19,22,-105,-204,-244,-146,-78,-348,-311,-315,-301,-176,-130,-92,-175,-215,-126,-56,-316,-271,-286,-249,-157,-108,3,0,0,-3,-7,2,1,2,2,0,1,670,670,670,670,670,670,670,670,671,671,671,671,11.581367623,13.909301979,12.123019889,11.634844869,12.40379586,13.665327979,12.163803015,12.29176775,11.37198945,11.375331781,9.0479434557,9.2018659339,9.9924364287,9.9940334129,9.7351650815,10.388219545,10.251120209,9.617769152,10.442340122,10.985320405,2.5334241676,4.7074360449,2.1305834603,1.6408114558,2.6686307789,3.2771084337,1.9126828063,2.6739985983,0.9296493276,0.3900113753,0.6173890829,0.617717852,0.4261166921,0.4688032731,0.6831694794,0.8567603748,0.6232337234,1.1213542509,0.4107752843,0.4766805698,-4.343012859,-5.197350203,-3.110651852,-1.662120696,-7.429468089,-6.661311914,-6.769607685,-6.490915952,-3.805076318,-2.816748822,-3.725623776,-4.579632351,-2.68453516,-1.193317422,-6.746298609,-5.804551539,-6.146373962,-5.369561701,-3.394301033,-2.340068252 +050,2,3,18,101,Indiana,Martin County,10334,10380,10361,10339,10322,10238,10245,10222,10195,10188,10204,10179,10079,-19,-22,-17,-84,7,-23,-27,-7,16,-25,-100,24,112,140,137,149,122,122,114,115,105,103,42,100,95,121,97,107,101,104,105,129,115,-18,12,45,16,52,15,21,10,10,-24,-12,0,3,6,0,0,-1,-1,-1,-1,-1,-1,0,-37,-67,-101,-46,-37,-47,-15,7,0,-85,0,-34,-61,-101,-46,-38,-48,-16,6,-1,-86,-1,0,-1,1,1,0,0,-1,0,0,-2,134,135,134,134,134,134,134,134,134,134,132,133,10.821256039,13.552102996,13.326848249,14.5486501,11.921629941,11.950825293,11.185792082,11.278932915,10.302703233,10.168822194,9.6618357488,9.1960698901,11.770428016,9.4712688571,10.455855768,9.893716021,10.20458225,10.29815614,12.657606829,11.353539342,1.1594202899,4.3560331059,1.5564202335,5.077381243,1.4657741731,2.0571092717,0.9812098317,0.9807767752,-2.354903596,-1.184717149,0.2898550725,0.5808044141,0,0,-0.097718278,-0.097957584,-0.098120983,-0.098077678,-0.098120983,-0.098726429,-3.574879227,-6.485649291,-9.824902724,-4.491529561,-3.615576294,-4.604006465,-1.471814748,0.6865437426,0,-8.391746471,-3.285024155,-5.904844877,-9.824902724,-4.491529561,-3.713294572,-4.70196405,-1.569935731,0.5884660651,-0.098120983,-8.4904729 +050,2,3,18,103,Indiana,Miami County,36903,36905,36810,36658,36547,36191,36088,36023,36047,35903,35652,35488,35328,-95,-152,-111,-356,-103,-65,24,-144,-251,-164,-160,84,403,359,354,402,364,342,403,350,363,352,71,336,364,370,338,385,385,397,399,363,389,13,67,-5,-16,64,-21,-43,6,-49,0,-37,0,-2,6,15,15,14,22,36,62,7,16,-112,-217,-109,-363,-181,-58,47,-186,-264,-173,-140,-112,-219,-103,-348,-166,-44,69,-150,-202,-166,-124,4,0,-3,8,-1,0,-2,0,0,2,1,3416,3416,3416,3411,3362,3386,3321,3286,3362,3311,3345,3343,10.970762781,9.808073219,9.7335642993,11.123562861,10.095547143,9.4907728597,11.202223767,9.7826846482,10.205229126,9.9412562133,9.1468394403,9.9446759101,10.173499409,9.3526473803,10.677982555,10.684057167,11.035441279,11.152260499,10.205229126,10.986217804,1.8239233408,-0.136602691,-0.43993511,1.7709154803,-0.582435412,-1.193284307,0.1667824878,-1.369575851,0,-1.044961591,-0.054445473,0.1639232293,0.4124391652,0.4150583157,0.3882902747,0.6105175524,1.000694927,1.7329327091,0.196795052,0.4518752824,-5.907333805,-2.977938665,-9.981027798,-5.008370343,-1.608631138,1.3042874983,-5.170257123,-7.378939277,-4.863649143,-3.953908721,-5.961779278,-2.814015436,-9.568588633,-4.593312027,-1.220340863,1.9148050506,-4.169562196,-5.646006568,-4.666854091,-3.502033439 +050,2,3,18,105,Indiana,Monroe County,137974,137957,138574,140280,141570,142185,143554,144432,145936,146840,147411,148178,148219,617,1706,1290,615,1369,878,1504,904,571,767,41,376,1243,1309,1286,1291,1347,1292,1265,1302,1233,1234,227,869,855,906,817,926,992,966,1008,960,1029,149,374,454,380,474,421,300,299,294,273,205,224,970,1050,833,974,834,1183,762,1201,832,656,229,358,-190,-588,-54,-368,22,-152,-931,-346,-829,453,1328,860,245,920,466,1205,610,270,486,-173,15,4,-24,-10,-25,-9,-1,-5,7,8,9,14976,14976,14975,14976,14979,14983,14981,14983,14995,15011,15004,15006,8.9150594935,9.2886287032,9.0641574598,9.0362183671,9.3546214052,8.8990522372,8.6414186955,8.849587597,8.3426649842,8.326669973,6.2326522123,6.0670569452,6.3857905588,5.7185053493,6.4308681672,6.8327088384,6.5989015493,6.8512936235,6.4955055838,6.9433901153,2.6824072812,3.221571758,2.678366901,3.3177130178,2.923753238,2.0663433987,2.0425171462,1.9982939735,1.8471594004,1.3832798578,6.9570456224,7.4507716871,5.8712621804,6.817410294,5.7919482197,8.1482808023,5.2053447004,8.163098851,5.6294381726,4.4264955448,2.5676518895,-1.348234877,-4.144420363,-0.377967306,-2.55567979,0.1515318492,-1.038336476,-6.327930916,-2.341088471,-5.593848791,9.524697512,6.1025368104,1.7268418178,6.4394429882,3.2362684297,8.2998126515,4.1670082247,1.8351679349,3.2883497018,-1.167353246 +050,2,3,18,107,Indiana,Montgomery County,38124,38121,38096,38340,38180,38143,38158,38255,38240,38343,38251,38275,38365,-25,244,-160,-37,15,97,-15,103,-92,24,90,104,476,439,496,433,458,452,463,440,443,431,58,364,420,391,385,397,389,428,446,406,420,46,112,19,105,48,61,63,35,-6,37,11,0,-3,2,25,28,10,35,9,23,20,21,-71,136,-177,-165,-59,32,-112,62,-109,-33,57,-71,133,-175,-140,-31,42,-77,71,-86,-13,78,0,-1,-4,-2,-2,-6,-1,-3,0,0,1,1171,1171,1171,1171,1171,1174,1174,1174,1176,1175,1175,1175,12.4548642,11.474124412,12.99739266,11.349785717,11.98748904,11.817765867,12.091456328,11.489150586,11.57776442,11.247390397,9.5243079177,10.977522216,10.245928488,10.091610857,10.390902072,10.170599386,11.177415353,11.645820821,10.610772809,10.960334029,2.9305562824,0.4966021955,2.751464172,1.2581748601,1.5965869682,1.6471664815,0.9140409752,-0.156670235,0.9669916107,0.2870563674,-0.078497043,0.0522739153,0.6551105171,0.7339353351,0.2617355686,0.9150924897,0.2350391079,0.6005692352,0.5226981679,0.5480167015,3.5585326286,-4.626241505,-4.323729413,-1.546506599,0.8375538194,-2.928295967,1.6191582988,-2.846175941,-0.862451977,1.487473904,3.4800355853,-4.57396759,-3.668618896,-0.812571264,1.0992893879,-2.013203477,1.8541974067,-2.245606705,-0.339753809,2.0354906054 +050,2,3,18,109,Indiana,Morgan County,68894,68926,69138,69237,69184,69352,69509,69576,69653,69835,70108,70403,70707,212,99,-53,168,157,67,77,182,273,295,304,205,806,750,751,716,768,786,816,779,769,747,115,633,633,679,641,660,676,712,727,745,728,90,173,117,72,75,108,110,104,52,24,19,8,19,25,19,29,34,56,42,65,52,39,116,-90,-189,90,67,-67,-86,41,161,220,244,124,-71,-164,109,96,-33,-30,83,226,272,283,-2,-3,-6,-13,-14,-8,-3,-5,-5,-1,2,592,592,592,592,592,592,592,591,590,590,590,590,11.649503162,10.836506021,10.841947219,10.312470744,11.043606428,11.290751208,11.699931177,11.133104192,10.945762253,10.587484941,9.1490514905,9.1460110821,9.8025062078,9.2322538366,9.4905992738,9.7106206322,10.208763478,10.389944477,10.604151988,10.318191482,2.5004516712,1.6904949394,1.0394410117,1.0802169076,1.5530071539,1.5801305762,1.491167699,0.743159715,0.3416102654,0.269293459,0.2746160795,0.3612168674,0.2742969336,0.4176838709,0.4889096596,0.8044301115,0.60220234,0.9289496438,0.740155575,0.552760258,-1.300813008,-2.730799517,1.2993012647,0.9649937707,-0.963439623,-1.235374814,0.587864189,2.30093681,3.1314274327,3.4582949472,-1.026196929,-2.36958265,1.5735981983,1.3826776417,-0.474529964,-0.430944703,1.190066529,3.2298864538,3.8715830077,4.0110552052 +050,2,3,18,111,Indiana,Newton County,14244,14239,14234,14086,14046,14032,14093,13978,14009,14036,13979,13972,13907,-5,-148,-40,-14,61,-115,31,27,-57,-7,-65,28,138,157,136,141,131,169,142,149,147,152,39,177,149,171,138,172,152,161,162,162,158,-11,-39,8,-35,3,-41,17,-19,-13,-15,-6,2,9,9,24,11,7,19,17,26,33,24,5,-118,-55,-3,49,-80,-5,30,-70,-23,-84,7,-109,-46,21,60,-73,14,47,-44,10,-60,-1,0,-2,0,-2,-1,0,-1,0,-2,1,170,170,170,169,170,169,169,169,169,169,169,169,9.7457627119,11.16166643,9.6872996652,10.026666667,9.3334758291,12.077035767,10.126582278,10.637158665,10.518407213,10.904264859,12.5,10.592919096,12.180354726,9.8133333333,12.25464002,10.862186015,11.481547513,11.565232911,11.591714071,11.334696366,-2.754237288,0.568747334,-2.493055061,0.2133333333,-2.921164191,1.2148497517,-1.354965234,-0.928074246,-1.073306858,-0.430431508,0.6355932203,0.6398407507,1.7095234703,0.7822222222,0.4987353496,1.3577732519,1.212337315,1.8561484919,2.3612750885,1.7217260303,-8.333333333,-3.910137921,-0.213690434,3.4844444444,-5.699832567,-0.35730875,2.1394187912,-4.997322863,-1.645737183,-6.026041106,-7.697740113,-3.27029717,1.4958330365,4.2666666667,-5.201097218,1.0004645014,3.3517561063,-3.141174371,0.7155379056,-4.304315076 +050,2,3,18,113,Indiana,Noble County,47536,47538,47455,47297,47192,47246,47372,47514,47432,47379,47649,47907,47832,-83,-158,-105,54,126,142,-82,-53,270,258,-75,153,568,578,582,623,652,629,573,658,626,628,129,448,442,439,420,461,432,459,437,468,495,24,120,136,143,203,191,197,114,221,158,133,2,-22,-7,-4,-13,0,37,20,39,42,34,-112,-256,-237,-80,-57,-43,-317,-187,12,58,-242,-110,-278,-244,-84,-70,-43,-280,-167,51,100,-208,3,0,3,-5,-7,-6,1,0,-2,0,0,831,831,792,831,814,803,818,815,811,813,823,823,11.98919284,12.234228323,12.32554692,13.168741677,13.742807158,13.249636636,12.087205071,13.848549901,13.102264641,13.119000616,9.4562647754,9.3555863646,9.2971049789,8.8778033778,9.7169234661,9.0999094222,9.6824208162,9.19728922,9.7953032777,10.340613543,2.5329280648,2.8786419583,3.0284419407,4.2909382993,4.025883692,4.1497272134,2.404784255,4.6512606811,3.306961363,2.7783870732,-0.464370145,-0.148165395,-0.084711663,-0.274789152,0,0.7793903903,0.4218919746,0.8208107084,0.8790656788,0.7102643646,-5.403579872,-5.016456942,-1.694233254,-1.204844744,-0.906350779,-6.677479831,-3.944689962,0.2525571411,1.2139478421,-5.055411066,-5.867950017,-5.164622337,-1.778944916,-1.479633896,-0.906350779,-5.89808944,-3.522797988,1.0733678495,2.0930135209,-4.345146701 +050,2,3,18,115,Indiana,Ohio County,6128,6097,6085,6055,6061,5992,5965,5888,5905,5867,5880,5908,5892,-12,-30,6,-69,-27,-77,17,-38,13,28,-16,13,53,53,59,59,41,58,56,61,61,56,7,63,51,56,65,65,67,65,87,54,82,6,-10,2,3,-6,-24,-9,-9,-26,7,-26,0,0,0,0,2,2,7,6,10,1,3,-18,-19,4,-70,-23,-56,18,-35,30,20,8,-18,-19,4,-70,-21,-54,25,-29,40,21,11,0,-1,0,-2,0,1,1,0,-1,0,-1,52,52,52,52,52,52,52,52,52,52,52,52,8.7314662273,8.7487619676,9.7900937526,9.8686961612,6.918079811,9.8363435937,9.5141012572,10.385630374,10.349507974,9.4915254237,10.378912685,8.4186200066,9.2922923753,10.872292381,10.967687505,11.362672772,11.043153245,14.8122925,9.1618595182,13.898305085,-1.647446458,0.330141961,0.4978013773,-1.00359622,-4.049607694,-1.526329178,-1.529051988,-4.426662127,1.1876484561,-4.406779661,0,0,0,0.3345320733,0.3374673079,1.1871449165,1.0193679918,1.7025623563,0.1696640652,0.5084745763,-3.13014827,0.6602839221,-11.61536547,-3.847118843,-9.44908462,3.0526583567,-5.946313286,5.107687069,3.393281303,1.3559322034,-3.13014827,0.6602839221,-11.61536547,-3.512586769,-9.111617312,4.2398032731,-4.926945294,6.8102494254,3.5629453682,1.8644067797 +050,2,3,18,117,Indiana,Orange County,19840,19846,19812,19942,19743,19830,19767,19628,19470,19413,19567,19657,19651,-34,130,-199,87,-63,-139,-158,-57,154,90,-6,45,233,208,236,242,221,243,253,248,262,264,27,226,210,223,217,236,240,251,211,229,251,18,7,-2,13,25,-15,3,2,37,33,13,0,3,4,8,9,9,12,8,14,12,6,-52,119,-206,69,-96,-133,-173,-67,105,45,-25,-52,122,-202,77,-87,-124,-161,-59,119,57,-19,0,1,5,-3,-1,0,0,0,-2,0,0,258,258,258,258,258,258,258,258,258,258,258,258,11.722090859,10.482550082,11.927324186,12.223148218,11.219697931,12.43030334,13.013399172,12.724474089,13.359167856,13.432380177,11.369925039,10.583343833,11.270310565,10.960426295,11.98121589,12.276842805,12.910526451,10.826064649,11.676524577,12.770937214,0.3521658198,-0.100793751,0.6570136204,1.2627219234,-0.761517959,0.1534605351,0.1028727207,1.8984094407,1.6826432796,0.6614429633,0.1509282085,0.2015875016,0.4043160741,0.4545798924,0.4569107755,0.6138421403,0.4114908829,0.7183170857,0.6118702835,0.3052813677,5.9868189365,-10.38175633,3.487226139,-4.848852186,-6.752125904,-8.849557522,-3.446236144,5.3873781426,2.2945135631,-1.272005699,6.1377471449,-10.18016883,3.8915422131,-4.394272293,-6.295215129,-8.235715382,-3.034745261,6.1056952283,2.9063838466,-0.966724331 +050,2,3,18,119,Indiana,Owen County,21575,21573,21566,21489,21368,21152,21016,20823,20898,20779,20879,20881,20833,-7,-77,-121,-216,-136,-193,75,-119,100,2,-48,64,222,225,208,233,225,224,205,239,224,237,79,198,205,246,221,245,243,243,235,234,281,-15,24,20,-38,12,-20,-19,-38,4,-10,-44,0,-2,3,1,4,6,6,2,6,4,2,11,-100,-143,-182,-154,-181,88,-80,91,8,-7,11,-102,-140,-181,-150,-175,94,-78,97,12,-5,-3,1,-1,3,2,2,0,-3,-1,0,1,197,197,197,197,197,197,197,197,197,197,197,197,10.312391128,10.500035,9.7836312324,11.051033959,10.755515189,10.737997651,9.837560285,11.474386672,10.727969349,11.363091528,9.1975380327,9.5666985557,11.5710254,10.481881996,11.711560984,11.648809952,11.661108045,11.282346728,11.206896552,13.472695018,1.1148530949,0.9333364445,-1.787394167,0.5691519636,-0.956045795,-0.910812301,-1.82354776,0.1920399443,-0.478927203,-2.10960349,-0.092904425,0.1400004667,0.0470366886,0.1897173212,0.2868137384,0.2876249371,0.0959761979,0.2880599165,0.1915708812,0.0958910677,-4.645221229,-6.673355578,-8.560677328,-7.304116866,-8.652214441,4.2184990772,-3.839047916,4.368908733,0.3831417625,-0.335618737,-4.738125653,-6.533355111,-8.51364064,-7.114399545,-8.365400703,4.5061240143,-3.743071718,4.6569686495,0.5747126437,-0.239727669 +050,2,3,18,121,Indiana,Parke County,17339,17349,17279,17082,17118,17235,17239,16974,16938,16902,16955,16893,16871,-70,-197,36,117,4,-265,-36,-36,53,-62,-22,44,186,182,200,197,214,219,198,196,198,187,54,159,154,171,153,155,162,174,146,167,193,-10,27,28,29,44,59,57,24,50,31,-6,1,3,1,2,2,2,0,0,0,0,0,-66,-230,8,87,-40,-329,-93,-60,4,-93,-17,-65,-227,9,89,-38,-327,-93,-60,4,-93,-17,5,3,-1,-1,-2,3,0,0,-1,0,1,1741,1690,1591,1583,1683,1694,1614,1458,1509,1553,1599,1603,10.826227409,10.643274854,11.643815678,11.428902941,12.509864671,12.915782024,11.70212766,11.578107925,11.699361853,11.076886625,9.254678269,9.0058479532,9.955462405,8.8762545687,9.06088329,9.5541401274,10.283687943,8.6245089642,9.8676435831,11.432294752,1.57154914,1.6374269006,1.6883532734,2.5526483727,3.4489813813,3.3616418967,1.4184397163,2.9535989603,1.8317182699,-0.355408127,0.1746165711,0.0584795322,0.1164381568,0.1160294715,0.1169146231,0,0,0,0,0,-13.38727045,0.4678362573,5.0650598201,-2.32058943,-19.2324555,-5.484784147,-3.546099291,0.2362879168,-5.49515481,-1.006989693,-13.21265388,0.5263157895,5.1814979769,-2.204559958,-19.11554088,-5.484784147,-3.546099291,0.2362879168,-5.49515481,-1.006989693 +050,2,3,18,123,Indiana,Perry County,19338,19338,19411,19429,19376,19424,19343,19323,19008,19010,19100,19184,19154,73,18,-53,48,-81,-20,-315,2,90,84,-30,51,217,196,209,167,217,227,218,202,206,206,52,208,195,210,225,200,210,228,216,200,204,-1,9,1,-1,-58,17,17,-10,-14,6,2,0,0,-3,0,1,1,11,8,10,7,7,67,10,-47,53,-20,-37,-345,5,94,70,-40,67,10,-50,53,-19,-36,-334,13,104,77,-33,7,-1,-4,-4,-4,-1,2,-1,0,1,1,1532,1619,1645,1668,1656,1669,1612,1354,1340,1513,1584,1583,11.174047374,10.101791006,10.773195876,8.6155751025,11.224331454,11.844199212,11.468251881,10.600892154,10.761675896,10.746517815,10.710607621,10.050251256,10.824742268,11.607810767,10.345005948,10.957188698,11.994318481,11.335607452,10.448229025,10.642182691,0.4634397528,0.05153975,-0.051546392,-2.992235664,0.8793255056,0.8870105137,-0.5260666,-0.734715298,0.3134468708,0.1043351244,0,-0.15461925,0,0.0515902701,0.0517250297,0.5739479794,0.42085328,0.5247966413,0.3656880159,0.3651729355,0.5149330587,-2.422368252,2.7319587629,-1.031805402,-1.9138261,-18.00109572,0.2630333,4.9330884282,3.6568801588,-2.086702488,0.5149330587,-2.576987502,2.7319587629,-0.980215131,-1.862101071,-17.42714774,0.68388658,5.4578850695,4.0225681747,-1.721529553 +050,2,3,18,125,Indiana,Pike County,12845,12695,12716,12593,12614,12490,12485,12399,12371,12302,12384,12383,12378,21,-123,21,-124,-5,-86,-28,-69,82,-1,-5,40,141,139,137,152,131,134,131,151,151,152,17,145,139,129,125,162,169,148,152,139,160,23,-4,0,8,27,-31,-35,-17,-1,12,-8,0,2,3,2,4,9,5,3,4,2,3,0,-121,20,-136,-36,-63,4,-54,79,-15,-2,0,-119,23,-134,-32,-54,9,-51,83,-13,1,-2,0,-2,2,0,-1,-2,-1,0,0,2,213,213,213,213,213,213,213,213,213,213,213,213,11.142281402,11.028682509,10.914595284,12.172172172,10.528853882,10.819539766,10.618895149,12.233654703,12.193644769,12.277371673,11.458374491,11.028682509,10.277246654,10.01001001,13.020414724,13.645538958,11.99691971,12.314672284,11.224613397,12.92354913,-0.316093089,0,0.6373486297,2.1621621622,-2.491560842,-2.825999193,-1.378024561,-0.081017581,0.9690313724,-0.646177456,0.1580465447,0.2380291189,0.1593371574,0.3203203203,0.7233563736,0.4037141704,0.2431808049,0.3240703233,0.1615052287,0.2423165462,-9.561815955,1.5868607926,-10.8349267,-2.882882883,-5.063494615,0.3229713363,-4.377254489,6.4003888844,-1.211289215,-0.161544364,-9.40376941,1.8248899115,-10.67558955,-2.562562563,-4.340138241,0.7266855067,-4.134073684,6.7244592076,-1.049783987,0.0807721821 +050,2,3,18,127,Indiana,Porter County,164343,164288,164492,165535,165742,166538,167242,167439,167616,168568,169647,170599,170980,204,1043,207,796,704,197,177,952,1079,952,381,445,1710,1847,1719,1821,1764,1782,1665,1674,1655,1656,317,1277,1367,1382,1364,1529,1388,1493,1617,1655,1798,128,433,480,337,457,235,394,172,57,0,-142,35,118,143,91,113,73,86,23,73,32,31,59,497,-398,394,169,-100,-298,768,958,924,488,94,615,-255,485,282,-27,-212,791,1031,956,519,-18,-5,-18,-26,-35,-11,-5,-11,-9,-4,4,3405,3405,3405,3405,3409,3411,3414,3414,3414,3417,3419,3421,10.362788499,11.150789219,10.346695558,10.911378752,10.541381196,10.637059587,9.9052899603,9.8990287243,9.7282554387,9.6961464259,7.7387607681,8.2529122155,8.3182857831,8.1730481155,9.137058871,8.2852069063,8.8820407872,9.5619650222,9.7282554387,10.527579272,2.6240277311,2.8978770032,2.0284097749,2.7383306369,1.4043223248,2.3518526809,1.0232491731,0.3370637021,0,-0.831432846,0.7150930075,0.8633258572,0.5477308294,0.6770926958,0.4362362967,0.5133485547,0.1368298313,0.4316780746,0.1880991988,0.1815099874,3.011874786,-2.402823015,2.3714939208,1.0126430583,-0.597583968,-1.778812434,4.5689265402,5.6650355543,5.4313643658,2.857318512,3.7269677935,-1.539497158,2.9192247502,1.6897357541,-0.161347671,-1.265463879,4.7057563715,6.0967136289,5.6194635646,3.0388284994 +050,2,3,18,129,Indiana,Posey County,25910,25912,25861,25695,25618,25565,25608,25621,25626,25563,25529,25408,25275,-51,-166,-77,-53,43,13,5,-63,-34,-121,-133,63,277,292,275,284,274,260,263,278,271,276,85,235,210,233,230,260,242,245,247,249,290,-22,42,82,42,54,14,18,18,31,22,-14,-1,2,5,4,7,4,-2,-1,0,-1,-1,-28,-211,-169,-101,-14,-5,-9,-81,-64,-142,-119,-29,-209,-164,-97,-7,-1,-11,-82,-64,-143,-120,0,1,5,2,-4,0,-2,1,-1,0,1,242,242,242,242,242,242,242,242,242,242,242,242,10.745597021,11.381131487,10.745755427,11.099603306,10.697066115,10.14693543,10.275645158,10.882329915,10.640595245,10.891225855,9.1163007215,8.1850603161,9.1045855069,8.9891153538,10.150500693,9.4444552852,9.5723690637,9.668832694,9.776783085,11.44367934,1.6292962992,3.196071171,1.6411699197,2.1104879526,0.5465654219,0.7024801452,0.7032760945,1.2134972207,0.8638121601,-0.552453485,0.0775855381,0.1948823885,0.1563018971,0.2735817716,0.1561615491,-0.078053349,-0.039070894,0,-0.039264189,-0.039460963,-8.185274265,-6.587024731,-3.946622902,-0.547163543,-0.195201936,-0.351240073,-3.164742425,-2.505284585,-5.575514852,-4.695854626,-8.107688727,-6.392142342,-3.790321005,-0.273581772,-0.039040387,-0.429293422,-3.203813319,-2.505284585,-5.614779041,-4.735315589 +050,2,3,18,131,Indiana,Pulaski County,13402,13379,13320,13226,13006,12935,12911,12801,12613,12529,12502,12379,12388,-59,-94,-220,-71,-24,-110,-188,-84,-27,-123,9,42,145,113,150,138,134,125,142,126,126,119,48,162,144,170,134,144,150,160,158,135,145,-6,-17,-31,-20,4,-10,-25,-18,-32,-9,-26,1,1,1,4,4,11,20,7,14,13,10,-58,-78,-195,-54,-30,-111,-183,-74,-9,-127,24,-57,-77,-194,-50,-26,-100,-163,-67,5,-114,34,4,0,5,-1,-2,0,0,1,0,0,1,193,193,193,193,193,193,193,193,193,193,193,193,10.92443306,8.615431534,11.564704522,10.678634992,10.423148724,9.8370976627,11.295839631,10.06751628,10.128210281,9.6095611095,12.20522866,10.978956999,13.106665125,10.36910934,11.200995644,11.804517195,12.727706626,12.624345811,10.851653872,11.709129083,-1.2807956,-2.363525465,-1.541960603,0.3095256519,-0.77784692,-1.967419533,-1.431866995,-2.556829531,-0.723443591,-2.099567974,0.0753409177,0.0762427569,0.3083921206,0.3095256519,0.8556316117,1.573935626,0.5568371649,1.11861292,1.0449740766,0.8075261437,-5.876591577,-14.8673376,-4.163293628,-2.32144239,-8.634100809,-14.40151098,-5.886564315,-0.719108306,-10.2085929,1.9380627448,-5.801250659,-14.79109485,-3.854901507,-2.011916738,-7.778469197,-12.82757535,-5.32972715,0.3995046143,-9.163618826,2.7455888884 +050,2,3,18,133,Indiana,Putnam County,37963,37941,37903,37868,37654,37508,37464,37397,37151,37409,37494,37566,37469,-38,-35,-214,-146,-44,-67,-246,258,85,72,-97,71,361,335,377,359,352,378,366,371,380,376,65,333,329,368,369,339,366,379,361,353,378,6,28,6,9,-10,13,12,-13,10,27,-2,9,39,52,29,34,28,60,30,58,38,25,-52,-100,-285,-183,-61,-107,-319,245,19,7,-121,-43,-61,-233,-154,-27,-79,-259,275,77,45,-96,-1,-2,13,-1,-7,-1,1,-4,-2,0,1,5424,5424,5382,5265,5242,5167,5173,4819,4697,4798,4826,4827,9.5287115123,8.8715870872,10.031664937,9.5769087126,9.4040955905,10.141117133,9.8175965665,9.9061452812,10.125233147,10.021989738,8.7896424754,8.7126929901,9.7921822197,9.843674972,9.056785242,9.8191769062,10.166309013,9.639133279,9.4058086864,10.075298194,0.739069037,0.1588940971,0.2394827173,-0.266766259,0.3473103485,0.3219402264,-0.348712446,0.2670120022,0.7194244604,-0.053308456,1.0294175872,1.3770821747,0.7716665336,0.907005282,0.7480530583,1.6097011322,0.80472103,1.5486696127,1.0125233147,0.6663557007,-2.639532275,-7.547469612,-4.869481919,-1.627274182,-2.85863133,-8.558244353,6.571888412,0.5073228042,0.1865174527,-3.225161591,-1.610114688,-6.170387437,-4.097815385,-0.7202689,-2.110578272,-6.94854322,7.3766094421,2.0559924169,1.1990407674,-2.558805891 +050,2,3,18,135,Indiana,Randolph County,26171,26170,26172,26030,25857,25618,25333,25139,25091,24917,24736,24533,24191,2,-142,-173,-239,-285,-194,-48,-174,-181,-203,-342,88,290,325,300,301,305,275,310,265,279,265,42,278,320,294,323,278,267,333,331,300,294,46,12,5,6,-22,27,8,-23,-66,-21,-29,0,-2,-1,2,7,7,11,10,18,16,15,-44,-154,-180,-249,-277,-228,-66,-160,-133,-198,-324,-44,-156,-181,-247,-270,-221,-55,-150,-115,-182,-309,0,2,3,2,7,0,-1,-1,0,0,-4,329,329,329,329,329,329,329,329,329,329,329,329,11.110685414,12.527222618,11.656143759,11.815273498,12.085909019,10.949631694,12.398016317,10.674078102,11.325579979,10.877596256,10.650932914,12.334496117,11.423020884,12.678848305,11.016008876,10.631096954,13.317869141,13.332527743,12.178042988,12.067974715,0.4597524999,0.1927265018,0.2331228752,-0.863574807,1.0699001427,0.3185347402,-0.919852824,-2.658449641,-0.852463009,-1.190378458,-0.076625417,-0.0385453,0.0777076251,0.2747738023,0.2773815185,0.4379852678,0.3999360102,0.7250317201,0.6494956261,0.6157129956,-5.900157082,-6.938154066,-9.67459932,-10.87319189,-9.034712316,-2.627911607,-6.398976164,-5.357178821,-8.037508372,-13.29940071,-5.976782499,-6.976699366,-9.596891695,-10.59841809,-8.757330797,-2.189926339,-5.999040154,-4.632147101,-7.388012746,-12.68368771 +050,2,3,18,137,Indiana,Ripley County,28818,28814,28815,28646,28449,28297,28343,28375,28412,28432,28526,28465,28448,1,-169,-197,-152,46,32,37,20,94,-61,-17,101,337,338,329,325,312,357,343,386,372,394,82,314,291,327,302,299,290,334,338,290,327,19,23,47,2,23,13,67,9,48,82,67,4,24,27,15,26,8,15,0,-1,-2,0,-20,-217,-274,-171,2,15,-45,14,48,-140,-83,-16,-193,-247,-156,28,23,-30,14,47,-142,-83,-2,1,3,2,-5,-4,0,-3,-1,-1,-1,449,449,449,449,449,449,449,449,449,449,449,449,11.729694924,11.83991593,11.595530963,11.475988701,11.001798371,12.573300227,12.068116248,13.553846694,13.054692846,13.845694305,10.929151947,10.193537087,11.525041413,10.663841808,10.543390105,10.213605227,11.751460137,11.868394255,10.177045498,11.491223446,0.800542977,1.6463788423,0.0704895499,0.8121468927,0.4584082655,2.3596950006,0.3166561115,1.6854524386,2.8776473478,2.354470859,0.8353491934,0.9457921009,0.5286716244,0.918079096,0.2820973941,0.5282899255,0,-0.035113592,-0.070186521,0,-7.552948957,-9.598038357,-6.026856519,0.0706214689,0.528932614,-1.584869777,0.4925761734,1.6854524386,-4.913056448,-2.916732557,-6.717599763,-8.652246256,-5.498184894,0.988700565,0.8110300081,-1.056579851,0.4925761734,1.6503388462,-4.983242968,-2.916732557 +050,2,3,18,139,Indiana,Rush County,17392,17391,17383,17284,17106,16998,16846,16709,16628,16642,16635,16605,16649,-8,-99,-178,-108,-152,-137,-81,14,-7,-30,44,46,169,176,186,177,198,184,205,178,192,186,32,202,174,218,178,208,189,208,198,183,197,14,-33,2,-32,-1,-10,-5,-3,-20,9,-11,0,-2,-2,1,3,0,4,3,7,7,6,-21,-65,-181,-78,-155,-129,-79,16,7,-45,48,-21,-67,-183,-77,-152,-129,-75,19,14,-38,54,-1,1,3,1,1,2,-1,-2,-1,-1,1,178,178,178,178,178,178,178,178,178,178,178,178,9.7499062509,10.235533585,10.9078114,10.45975653,11.801519893,11.038785734,12.323414488,10.698079755,11.55234657,11.186624166,11.653734099,10.119220704,12.784424114,10.5188512,12.397556251,11.338752737,12.503757139,11.900111188,11.010830325,11.848198713,-1.903827848,0.1163128817,-1.876612714,-0.05909467,-0.596036358,-0.299967004,-0.180342651,-1.202031433,0.5415162455,-0.661574547,-0.115383506,-0.116312882,0.0586441473,0.177284009,0,0.2399736029,0.180342651,0.4207110016,0.421179302,0.360858844,-3.749963943,-10.52631579,-4.57424349,-9.159673797,-7.688869021,-4.739478657,0.9618274722,0.4207110016,-2.707581227,2.8868707524,-3.865347449,-10.64262867,-4.515599343,-8.982389788,-7.688869021,-4.499505054,1.1421701232,0.8414220032,-2.286401925,3.2477295964 +050,2,3,18,141,Indiana,St. Joseph County,266931,266914,266799,266726,266576,267188,268023,268567,270042,270219,270961,271695,271484,-115,-73,-150,612,835,544,1475,177,742,734,-211,872,3543,3509,3589,3448,3503,3521,3546,3452,3594,3508,604,2543,2523,2524,2632,2667,2592,2761,2823,2562,2640,268,1000,986,1065,816,836,929,785,629,1032,868,118,388,495,516,582,428,696,466,771,538,434,-509,-1464,-1637,-950,-520,-695,-137,-1070,-657,-844,-1517,-391,-1076,-1142,-434,62,-267,559,-604,114,-306,-1083,8,3,6,-19,-43,-25,-13,-4,-1,8,4,11272,11273,11246,11272,11391,11440,11561,11778,11588,11607,11611,11614,13.281476969,13.159523122,13.447890828,12.884638021,13.056523603,13.074419477,13.126988622,12.757308105,13.245960609,12.91655237,9.5328241413,9.4618058811,9.4573631792,9.8353733387,9.9405505134,9.6247927532,10.220985783,10.432758047,9.4424460432,9.720552525,3.7486528279,3.6977172409,3.9905276489,3.0492646825,3.1159730893,3.4496267237,2.9060028394,2.3245500573,3.8035145654,3.1959998454,1.4544772972,1.8563590611,1.9334387482,2.1748431927,1.59525895,2.5844350911,1.7250921314,2.8493292435,1.9828399575,1.5979999227,-5.48802774,-6.139110673,-3.559625602,-1.943158866,-2.590432174,-0.508717827,-3.961048456,-2.428027643,-3.110626253,-5.585635674,-4.033550443,-4.282751612,-1.626186854,0.2316843264,-0.995173224,2.0757172643,-2.235956325,0.4213016002,-1.127786296,-3.987635752 +050,2,3,18,143,Indiana,Scott County,24181,24195,24172,23909,23724,23761,23645,23670,23700,23810,23773,23855,23788,-23,-263,-185,37,-116,25,30,110,-37,82,-67,64,289,281,285,280,272,291,298,271,260,264,90,297,301,298,288,311,294,349,348,291,331,-26,-8,-20,-13,-8,-39,-3,-51,-77,-31,-67,0,-2,3,10,21,15,23,13,22,14,11,5,-253,-171,44,-132,52,10,150,19,98,-11,5,-255,-168,54,-111,67,33,163,41,112,0,-2,0,3,-4,3,-3,0,-2,-1,1,0,312,312,312,312,312,312,312,312,312,312,312,312,12.021380587,11.798543027,12.003790671,11.812850694,11.497410969,12.286257125,12.544727426,11.390622701,10.917947426,11.08242554,12.354152368,12.638296979,12.551332,12.150360714,13.145936807,12.412919569,14.691643864,14.627072694,12.219702696,13.89501081,-0.332771781,-0.839753952,-0.547541329,-0.33751002,-1.648525837,-0.126662445,-2.146916439,-3.236449993,-1.30175527,-2.81258527,-0.083192945,0.1259630928,0.4211856376,0.8859638021,0.634048399,0.9710787418,0.5472532099,0.9246999979,0.5878894768,0.4617677308,-10.52390757,-7.17989629,1.8532168053,-5.568915327,2.19803445,0.4222081486,6.3144601137,0.7986045436,4.1152263374,-0.461767731,-10.60710052,-7.053933198,2.2744024429,-4.682951525,2.832082849,1.3932868904,6.8617133235,1.7233045415,4.7031158142,0 +050,2,3,18,145,Indiana,Shelby County,44436,44379,44295,44277,44258,44336,44359,44343,44241,44378,44535,44771,44871,-84,-18,-19,78,23,-16,-102,137,157,236,100,130,539,517,471,517,511,499,509,465,499,488,136,471,420,434,428,429,438,508,486,463,477,-6,68,97,37,89,82,61,1,-21,36,11,8,35,11,1,19,12,36,24,41,45,37,-88,-120,-122,47,-78,-106,-198,115,139,155,51,-80,-85,-111,48,-59,-94,-162,139,180,200,88,2,-1,-5,-7,-7,-4,-1,-3,-2,0,1,683,683,683,683,683,683,683,683,683,683,683,683,12.17088922,11.678997007,10.632774229,11.657928857,11.521724426,11.26614287,11.487378553,10.459662816,11.175061026,10.887753508,10.635415255,9.487773197,9.7975032169,9.6510513558,9.6728371401,9.8889189921,11.464810029,10.932034686,10.368844199,10.642332835,1.5354739647,2.1912238098,0.8352710116,2.0068775016,1.8488872855,1.3772238779,0.0225685237,-0.472371869,0.8062168275,0.2454206733,0.7903174818,0.248489298,0.0225748922,0.4284345228,0.2705688711,0.8127878624,0.5416445683,0.9222498397,1.0077710344,0.8255059013,-2.709659938,-2.755972214,1.0610199336,-1.758836462,-2.390025028,-4.470333243,2.5953802232,3.1266518957,3.4712113408,1.1378594855,-1.919342456,-2.507482916,1.0835948258,-1.330401939,-2.119456157,-3.657545381,3.1370247915,4.0489017354,4.4789823752,1.9633653868 +050,2,3,18,147,Indiana,Spencer County,20952,20955,20916,20971,20784,20765,20764,20644,20496,20441,20385,20273,20225,-39,55,-187,-19,-1,-120,-148,-55,-56,-112,-48,50,236,233,207,218,246,195,202,201,182,182,56,187,184,207,148,190,219,209,205,208,250,-6,49,49,0,70,56,-24,-7,-4,-26,-68,0,0,-1,2,0,-1,-2,-1,-1,-2,-1,-31,6,-239,-20,-71,-176,-120,-47,-50,-84,21,-31,6,-240,-18,-71,-177,-122,-48,-51,-86,20,-2,0,4,-1,0,1,-2,0,-1,0,0,368,368,368,368,368,368,368,368,368,368,368,368,11.268412634,11.160340079,9.9641387278,10.498687664,11.881761978,9.4798249878,9.8688228253,9.8466663401,8.9527276305,8.9880981777,8.9287845871,8.8133157706,9.9641387278,7.1275494233,9.1769706337,10.646572679,10.210811735,10.042619899,10.231688721,12.346288706,2.3396280469,2.3470243085,0,3.3711382407,2.7047913447,-1.166747691,-0.34198891,-0.195953559,-1.27896109,-3.358190528,0,-0.047898455,0.0962718718,0,-0.048299845,-0.097228974,-0.048855559,-0.04898839,-0.098381622,-0.049385155,0.286485067,-11.44773081,-0.962718718,-3.419297358,-8.500772798,-5.833738454,-2.296211251,-2.449419488,-4.132028137,1.0370882513,0.286485067,-11.49562927,-0.866446846,-3.419297358,-8.549072643,-5.930967428,-2.34506681,-2.498407877,-4.230409759,0.9877030964 +050,2,3,18,149,Indiana,Starke County,23363,23362,23348,23174,23165,23146,22960,22864,23023,22946,22953,23011,23049,-14,-174,-9,-19,-186,-96,159,-77,7,58,38,65,272,265,253,250,284,267,252,274,267,270,81,265,274,247,300,296,260,257,280,278,315,-16,7,-9,6,-50,-12,7,-5,-6,-11,-45,0,-2,2,-1,-2,-1,2,1,2,1,1,4,-178,4,-22,-134,-80,150,-71,12,68,81,4,-180,6,-23,-136,-81,152,-70,14,69,82,-2,-1,-6,-2,0,-3,0,-2,-1,0,1,16,16,16,16,16,16,16,16,16,16,16,16,11.693392374,11.437450096,10.926129861,10.844575543,12.395251397,11.637282891,10.963910461,11.939257936,11.617787834,11.723838472,11.392459482,11.825891797,10.667012157,13.013490652,12.918994413,11.332185586,11.181448367,12.20070154,12.096423288,13.67781155,0.300932892,-0.388441701,0.2591177042,-2.168915109,-0.523743017,0.3050973042,-0.217537906,-0.261443604,-0.478635454,-1.953973079,-0.085980826,0.0863203781,-0.043186284,-0.086756604,-0.043645251,0.0871706584,0.0435075812,0.0871478681,0.043512314,0.043421624,-7.652293539,0.1726407562,-0.950098249,-5.812692491,-3.491620112,6.5377993767,-3.089038265,0.5228872089,2.958837351,3.5171515415,-7.738274365,0.2589611342,-0.993284533,-5.899449096,-3.535265363,6.6249700351,-3.045530684,0.610035077,3.002349665,3.5605731654 +050,2,3,18,151,Indiana,Steuben County,34185,34147,34110,34074,34168,34383,34506,34489,34372,34422,34570,34759,34831,-37,-36,94,215,123,-17,-117,50,148,189,72,84,368,356,378,383,391,429,384,349,378,381,64,292,283,313,309,328,332,337,306,343,379,20,76,73,65,74,63,97,47,43,35,2,1,0,15,23,15,1,20,15,27,32,23,-58,-111,13,131,43,-76,-233,-10,81,122,47,-57,-111,28,154,58,-75,-213,5,108,154,70,0,-1,-7,-4,-9,-5,-1,-2,-3,0,0,1300,1300,1300,1300,1301,1303,1304,1304,1308,1309,1311,1311,10.794321248,10.433457402,11.02828551,11.119336904,11.334154649,12.459882953,11.163764282,10.117115028,10.904527687,10.949849116,8.5650592514,8.294012485,9.1318872081,8.9709532727,9.5079353576,9.6426133806,9.7973660494,8.870593692,9.8948491973,10.892369593,2.2292619969,2.1394449166,1.896398302,2.1483836316,1.8262192913,2.817269572,1.3663982324,1.2465213358,1.0096784895,0.0574795229,0,0.4396119692,0.6710332453,0.4354831686,0.0289876078,0.5808803241,0.4360845423,0.7826994434,0.923134619,0.6610145136,-3.255895811,0.3809970399,3.8219719625,1.2483850832,-2.203058193,-6.767255776,-0.290723028,2.3480983302,3.5194507349,1.3507687886,-3.255895811,0.8206090091,4.4930052078,1.6838682518,-2.174070585,-6.186375452,0.1453615141,3.1307977737,4.4425853539,2.0117833022 +050,2,3,18,153,Indiana,Sullivan County,21475,21473,21387,21216,21202,21138,20994,20874,20695,20690,20673,20601,20578,-86,-171,-14,-64,-144,-120,-179,-5,-17,-72,-23,52,227,245,239,244,230,191,214,223,211,211,94,238,231,221,240,265,238,229,220,239,226,-42,-11,14,18,4,-35,-47,-15,3,-28,-15,-1,-1,2,1,-2,-1,-5,-6,-6,-6,-2,-47,-159,-30,-78,-147,-83,-127,18,-14,-39,-7,-48,-160,-28,-77,-149,-84,-132,12,-20,-45,-9,4,0,0,-5,1,-1,0,-2,0,1,1,2298,2265,2244,2208,2232,2219,2184,2173,2177,2225,2262,2260,10.656526536,11.55169975,11.289560699,11.58264502,10.986911245,9.1895402824,10.341911321,10.782583468,10.224354315,10.247941912,11.172922095,10.891602622,10.439300897,11.392765594,12.658832521,11.450840771,11.066811647,10.637526292,11.58114067,10.976468588,-0.516395559,0.6600971286,0.8502598016,0.1898794266,-1.671921276,-2.261300488,-0.724900326,0.1450571767,-1.356786355,-0.728526676,-0.046945051,0.0942995898,0.0472366556,-0.094939713,-0.047769179,-0.240563882,-0.28996013,-0.290114353,-0.290739933,-0.09713689,-7.46426308,-1.414493847,-3.68445914,-6.978068926,-3.964841884,-6.110322596,0.8698803914,-0.676933491,-1.889809565,-0.339979116,-7.511208131,-1.320194257,-3.637222485,-7.07300864,-4.012611063,-6.350886478,0.579920261,-0.967047845,-2.180549498,-0.437116006 +050,2,3,18,155,Indiana,Switzerland County,10613,10688,10718,10633,10462,10598,10565,10616,10650,10689,10757,10815,10724,30,-85,-171,136,-33,51,34,39,68,58,-91,34,126,124,112,135,132,131,114,118,118,113,14,109,112,88,110,120,95,106,137,84,124,20,17,12,24,25,12,36,8,-19,34,-11,2,2,1,13,12,7,15,11,13,11,9,9,-104,-190,99,-72,33,-17,21,74,13,-90,11,-102,-189,112,-60,40,-2,32,87,24,-81,-1,0,6,0,2,-1,0,-1,0,0,1,107,107,107,107,107,107,107,107,107,107,107,107,11.802725868,11.756340365,10.636277303,12.758115579,12.464000755,12.320135427,10.684661887,11.004383102,10.940107547,10.492594828,10.2102946,10.618630007,8.3570750237,10.395501583,11.330909778,8.9344493558,9.9348610525,12.776275296,7.7878731689,11.513997864,1.5924312679,1.1377103579,2.2792022792,2.3626139961,1.1330909778,3.3856860717,0.7498008342,-1.771892194,3.1522343779,-1.021403036,0.187344855,0.0948091965,1.2345679012,1.1340547181,0.660969737,1.4107025299,1.030976147,1.2123472909,1.019840534,0.8356933934,-9.741932462,-18.01374733,9.4017094017,-6.804328309,3.1160001888,-1.598796201,1.9682271897,6.9010538096,1.2052660857,-8.356933934,-9.554587607,-17.91893814,10.636277303,-5.670273591,3.7769699259,-0.188093671,2.9992033366,8.1134011004,2.2251066197,-7.52124054 +050,2,3,18,157,Indiana,Tippecanoe County,172780,172801,173105,175892,179181,182043,184542,186858,190475,191334,193705,194881,196115,304,2787,3289,2862,2499,2316,3617,859,2371,1176,1234,555,2131,2279,2299,2209,2384,2381,2258,2263,2136,2142,233,1084,1150,1112,1117,1192,1172,1256,1318,1236,1304,322,1047,1129,1187,1092,1192,1209,1002,945,900,838,320,1497,1728,1540,1715,1382,1975,1274,1973,1449,1150,-347,244,459,165,-279,-244,434,-1431,-551,-1184,-769,-27,1741,2187,1705,1436,1138,2409,-157,1422,265,381,9,-1,-27,-30,-29,-14,-1,14,4,11,15,14463,14461,14482,14632,14600,14767,15149,16093,15849,16555,16549,16552,12.212139359,12.83679694,12.728943813,12.051775168,12.837910609,12.620152491,11.827903481,11.754653425,10.993705383,10.956633827,6.212087783,6.477541238,6.1568445065,6.0940845916,6.4189553043,6.2120196219,6.5792058333,6.8460597498,6.3615261487,6.6701449631,6.0000515764,6.3592557023,6.5720993068,5.9576905765,6.4189553043,6.4081328694,5.2486976473,4.9085936749,4.6321792345,4.2864888643,8.5788703055,9.7332097907,8.5265652338,9.3566294311,7.4421109316,10.468207127,6.673493815,10.248312509,7.4578085675,5.8824131193,1.398292822,2.5853838506,0.9135605608,-1.522157208,-1.313947227,2.300355389,-7.495894544,-2.862047741,-6.093889126,-3.933544077,9.9771631275,12.318593641,9.4401257945,7.8344722234,6.1281637049,12.768562516,-0.822400729,7.386264768,1.3639194413,1.9488690421 +050,2,3,18,159,Indiana,Tipton County,15936,15936,15878,15817,15660,15544,15406,15250,15161,15148,15100,15133,15227,-58,-61,-157,-116,-138,-156,-89,-13,-48,33,94,39,153,148,131,171,150,147,153,150,139,145,54,164,179,180,168,182,174,167,184,167,168,-15,-11,-31,-49,3,-32,-27,-14,-34,-28,-23,0,-1,-1,0,10,3,9,12,22,17,11,-44,-50,-131,-65,-153,-130,-70,-11,-35,44,106,-44,-51,-132,-65,-143,-127,-61,1,-13,61,117,1,1,6,-2,2,3,-1,0,-1,0,0,205,205,205,205,205,205,205,205,205,205,205,205,9.6545196403,9.4036915843,8.3963594411,11.050080775,9.7860125261,9.6675545033,10.096011086,9.9180111082,9.1952502233,9.5520421607,10.348635431,11.373383741,11.536982438,10.856219709,11.873695198,11.443227779,11.019829094,12.166093626,11.047530844,11.067193676,-0.694115791,-1.969692156,-3.140622997,0.1938610662,-2.087682672,-1.775673276,-0.923818008,-2.248082518,-1.852280621,-1.515151515,-0.063101436,-0.063538457,0,0.6462035541,0.1957202505,0.591891092,0.7918440067,1.4546416292,1.1245989482,0.7246376812,-3.155071778,-8.323537821,-4.166132547,-9.886914378,-8.481210856,-4.603597383,-0.725857006,-2.314202592,2.9107266894,6.9828722003,-3.218173213,-8.387076278,-4.166132547,-9.240710824,-8.285490605,-4.01170629,0.0659870006,-0.859560963,4.0353256375,7.7075098814 +050,2,3,18,161,Indiana,Union County,7516,7516,7537,7497,7355,7311,7252,7201,7162,7199,7086,7135,7119,21,-40,-142,-44,-59,-51,-39,37,-113,49,-16,19,80,73,64,76,80,65,77,64,70,70,8,73,59,77,76,72,72,82,75,70,70,11,7,14,-13,0,8,-7,-5,-11,0,0,0,0,0,0,-2,-4,0,5,8,6,7,11,-48,-160,-32,-57,-56,-32,38,-109,44,-23,11,-48,-160,-32,-59,-60,-32,43,-101,50,-16,-1,1,4,1,0,1,0,-1,-1,-1,0,67,67,67,67,67,67,67,67,67,67,67,67,10.642543568,9.830325882,8.7276694395,10.437409874,11.070366014,9.0510339066,10.723487222,8.9604480224,9.84459602,9.8218044058,9.7113210057,7.9450579047,10.500477294,10.437409874,9.9633294126,10.025760635,11.419817561,10.500525026,9.84459602,9.8218044058,0.9312225622,1.8852679774,-1.772807855,0,1.1070366014,-0.974726728,-0.696330339,-1.540077004,0,0,0,0,0,-0.274668681,-0.553518301,0,0.6963303391,1.1200560028,0.843822516,0.9821804406,-6.385526141,-21.54591974,-4.36383472,-7.828057406,-7.74925621,-4.455893616,5.2921105773,-15.26076304,6.188031784,-3.227164305,-6.385526141,-21.54591974,-4.36383472,-8.102726087,-8.30277451,-4.455893616,5.9884409164,-14.14070704,7.0318543,-2.244983864 +050,2,3,18,163,Indiana,Vanderburgh County,179703,179701,179845,180488,181075,181633,182010,181600,181536,181031,181165,181561,182447,144,643,587,558,377,-410,-64,-505,134,396,886,628,2245,2319,2313,2234,2242,2268,2157,2142,2100,2069,476,1818,1853,1963,1940,1994,1938,2017,2018,1937,2032,152,427,466,350,294,248,330,140,124,163,37,32,142,218,156,135,109,176,110,207,157,116,-16,80,-71,80,-15,-751,-560,-745,-191,73,727,16,222,147,236,120,-642,-384,-635,16,230,843,-24,-6,-26,-28,-37,-16,-10,-10,-6,3,6,7531,7531,7528,7414,7347,7329,7194,7199,7076,7062,7065,7069,12.460696078,12.827639996,12.754061118,12.286775766,12.331894062,12.491187875,11.898490486,11.827850114,11.578987996,11.367882025,10.090666134,10.24994261,10.824134014,10.669805276,10.967795165,10.673686993,11.12621943,11.143137969,10.680237976,11.164589789,2.3700299445,2.5776973861,1.9299271039,1.6169704903,1.3640988972,1.8175008812,0.7722710561,0.6847121448,0.8987500207,0.2032922353,0.788159841,1.2058756012,0.8601960806,0.7424864496,0.5995434669,0.9693338033,0.6067844012,1.1430275321,0.8656671978,0.6373486297,0.4440337133,-0.392739301,0.4411261952,-0.082498494,-4.130799483,-3.08424392,-4.109585263,-1.054677578,0.402507678,3.9944177051,1.2321935543,0.8131362999,1.3013222758,0.6599879552,-3.531256016,-2.114910116,-3.502800862,0.0883499542,1.2681748758,4.6317663348 +050,2,3,18,165,Indiana,Vermillion County,16212,16210,16117,16072,15924,15853,15661,15597,15588,15507,15508,15493,15329,-93,-45,-148,-71,-192,-64,-9,-81,1,-15,-164,35,181,152,164,157,164,154,169,163,179,172,67,237,217,182,204,228,228,181,210,209,215,-32,-56,-65,-18,-47,-64,-74,-12,-47,-30,-43,0,1,2,11,10,9,16,14,18,14,9,-63,10,-88,-64,-156,-8,50,-82,31,1,-129,-63,11,-86,-53,-146,1,66,-68,49,15,-120,2,0,3,0,1,-1,-1,-1,-1,0,-1,209,209,209,209,209,209,209,209,209,209,209,209,11.246077853,9.5011876485,10.321930956,9.9638256013,10.493313712,9.8765432099,10.869914777,10.511043044,11.54801458,11.160859127,14.725527354,13.564195524,11.454825817,12.946626896,14.588265404,14.622414622,11.641743046,13.541834596,13.483436018,13.951073908,-3.479449501,-4.063007876,-1.132894861,-2.982801295,-4.094951692,-4.745871413,-0.771828268,-3.030791552,-1.935421438,-2.790214782,0.0621330268,0.125015627,0.6923246373,0.6346385733,0.5758525817,1.0261343595,0.9004663129,1.1607286797,0.9031966711,0.5839984427,0.6213302681,-5.500687586,-4.028070617,-9.900361744,-0.511868962,3.2066698733,-5.274159833,1.9990327261,0.0645140479,-8.370644345,0.6834632949,-5.375671959,-3.33574598,-9.265723171,0.0639836202,4.2328042328,-4.37369352,3.1597614058,0.967710719,-7.786645902 +050,2,3,18,167,Indiana,Vigo County,107848,107850,107891,108350,108561,108251,107989,107615,107871,107648,107438,106958,106608,41,459,211,-310,-262,-374,256,-223,-210,-480,-350,332,1323,1264,1269,1340,1290,1292,1240,1202,1107,1115,319,1137,1084,1200,1114,1148,1163,1190,1166,1180,1254,13,186,180,69,226,142,129,50,36,-73,-139,52,186,208,137,150,136,183,121,196,133,108,-9,92,-156,-514,-632,-650,-57,-393,-441,-543,-323,43,278,52,-377,-482,-514,126,-272,-245,-410,-215,-15,-5,-21,-2,-6,-2,1,-1,-1,3,4,9545,9548,9519,9509,9513,9522,9508,9518,9543,9595,9599,9595,12.236347409,11.654549562,11.705994133,12.3936367,11.966382813,11.991498288,11.507106102,11.176924579,10.326685199,10.441736981,10.516044598,9.9948826938,11.069497998,10.30336663,10.649153077,10.794204728,11.043109888,10.842174758,11.007668054,11.743442308,1.7203028103,1.659666868,0.6364961349,2.0902700703,1.317229736,1.1972935597,0.4639962138,0.334749821,-0.680982854,-1.301705328,1.7203028103,1.9178372697,1.2637676881,1.3873473918,1.2615721415,1.6984862126,1.1228708374,1.8225268032,1.2406947891,1.0113969452,0.8509024653,-1.438377952,-4.741434976,-5.845357011,-6.029572735,-0.529036689,-3.64701024,-4.100685307,-5.065393011,-3.024826049,2.5712052756,0.4794593174,-3.477667288,-4.458009619,-4.768000594,1.1694495234,-2.524139403,-2.278158504,-3.824698222,-2.013429104 +050,2,3,18,169,Indiana,Wabash County,32888,32888,32850,32574,32396,32281,32117,31883,31569,31401,31210,31028,30784,-38,-276,-178,-115,-164,-234,-314,-168,-191,-182,-244,83,369,353,342,334,325,382,312,318,308,303,87,410,416,448,410,418,424,458,460,401,427,-4,-41,-63,-106,-76,-93,-42,-146,-142,-93,-124,2,4,22,11,1,7,7,11,13,11,7,-36,-240,-134,-18,-89,-148,-278,-33,-61,-100,-128,-34,-236,-112,-7,-88,-141,-271,-22,-48,-89,-121,0,1,-3,-2,0,0,-1,0,-1,0,1,1839,1839,1839,1839,1839,1839,1839,1840,1840,1842,1842,1843,11.280264123,10.866553794,10.575629667,10.37299295,10.15625,12.040597617,9.9094807051,10.157959464,9.8974902793,9.8039215686,12.533626804,12.80591042,13.853456406,12.733314699,13.0625,13.364432957,14.546609497,14.693903627,12.886018188,13.816087491,-1.25336268,-1.939356626,-3.277826739,-2.360321749,-2.90625,-1.32383534,-4.637128791,-4.535944163,-2.988527909,-4.012165922,0.1222792859,0.6772356472,0.3401518314,0.0310568651,0.21875,0.2206392233,0.3493727172,0.4152624938,0.3534817957,0.2264932376,-7.336757153,-4.12498076,-0.556612088,-2.764060996,-4.625,-8.762529156,-1.048118152,-1.948539394,-3.21347087,-4.14159063,-7.214477867,-3.447745113,-0.216460256,-2.733004131,-4.40625,-8.541889933,-0.698745434,-1.5332769,-2.859989074,-3.915097392 +050,2,3,18,171,Indiana,Warren County,8508,8511,8521,8472,8393,8370,8340,8272,8166,8203,8268,8262,8194,10,-49,-79,-23,-30,-68,-106,37,65,-6,-68,24,98,114,75,87,86,79,90,77,73,75,4,71,72,72,77,90,89,92,74,74,95,20,27,42,3,10,-4,-10,-2,3,-1,-20,0,4,2,4,2,0,2,2,2,3,2,-9,-80,-125,-29,-44,-64,-98,37,61,-8,-50,-9,-76,-123,-25,-42,-64,-96,39,63,-5,-48,-1,0,2,-1,2,0,0,0,-1,0,0,84,84,84,84,84,84,84,85,84,84,84,84,11.534161125,13.519122443,8.9482789477,10.412926391,10.353960992,9.611874924,10.996395626,9.3497662558,8.8324258923,9.1152163345,8.3563820397,8.5383931218,8.5903477898,9.2160383004,10.835540573,10.828567952,11.240759973,8.9854896485,8.9534180278,11.54594069,3.1777790855,4.9807293211,0.3579311579,1.196888091,-0.481579581,-1.216693028,-0.244364347,0.3642766074,-0.120992136,-2.430724356,0.4707820867,0.2371775867,0.4772415439,0.2393776182,0,0.2433386057,0.2443643472,0.2428510716,0.3629764065,0.2430724356,-9.415641735,-14.82359917,-3.460001193,-5.2663076,-7.705273296,-11.92359168,4.520740424,7.4069576832,-0.967937084,-6.07681089,-8.944859648,-14.58642158,-2.982759649,-5.026929982,-7.705273296,-11.68025307,4.7651047712,7.6498087548,-0.604960678,-5.833738454 +050,2,3,18,173,Indiana,Warrick County,59689,59689,59840,60213,60365,60877,60986,61563,62046,62433,62443,62851,63269,151,373,152,512,109,577,483,387,10,408,418,166,664,637,645,615,688,667,630,638,599,612,130,498,465,574,480,551,558,602,655,627,675,36,166,172,71,135,137,109,28,-17,-28,-63,17,65,77,70,66,48,46,24,49,31,25,98,143,-94,378,-88,398,332,343,-21,406,458,115,208,-17,448,-22,446,378,367,28,437,483,0,-1,-3,-7,-4,-6,-4,-8,-1,-1,-2,726,726,726,726,726,726,727,726,727,727,727,727,11.061781047,10.565774851,10.63987727,10.093301494,11.228161797,10.792094427,10.122189285,10.218136391,9.5615113254,9.7050428164,8.296335785,7.7128497736,9.4686659738,7.8776987273,8.9923214388,9.0284688008,9.6723142056,10.490406483,10.008460102,10.704091342,2.7654452617,2.8529250775,1.1712112964,2.215602767,2.2358403577,1.763625626,0.4498750793,-0.272270092,-0.446948776,-0.999048525,1.0828550723,1.2771815754,1.1547153627,1.083183575,0.7833601253,0.7442823743,0.3856072109,0.7847785003,0.4948361454,0.3964478275,2.3822811592,-1.559156728,6.2354629584,-1.444244767,6.4953610393,5.371777136,5.5109697218,-0.336333643,6.4807572589,7.2629241992,3.4651362315,-0.281975153,7.390178321,-0.361061192,7.2787211646,6.1160595102,5.8965769327,0.4484448573,6.9755934043,7.6593720266 +050,2,3,18,175,Indiana,Washington County,28262,28260,28297,28201,27919,27788,27895,27784,27719,27780,27936,28063,28213,37,-96,-282,-131,107,-111,-65,61,156,127,150,70,296,305,310,346,327,308,322,321,309,301,52,302,303,289,290,302,359,310,315,304,324,18,-6,2,21,56,25,-51,12,6,5,-23,1,11,2,-1,0,0,-1,-1,-1,-1,0,22,-102,-293,-150,57,-135,-11,52,152,123,174,23,-91,-291,-151,57,-135,-12,51,151,122,174,-4,1,7,-1,-6,-1,-2,-2,-1,0,-1,261,261,261,261,261,261,261,261,261,261,261,261,10.478247018,10.869565217,11.129660545,12.427491335,11.745900609,11.09849918,11.603812681,11.522722378,11.035911356,10.697277703,10.690643917,10.79828938,10.375715799,10.416105454,10.847895975,12.936237681,11.171372457,11.307344389,10.857336738,11.51467766,-0.212396899,0.0712758375,0.7539447466,2.0113858808,0.8980046337,-1.837738501,0.4324402241,0.2153779884,0.1785746174,-0.817399957,0.3893943148,0.0712758375,-0.035902131,0,0,-0.036034088,-0.036036685,-0.035896331,-0.035714923,0,-3.610747283,-10.44191019,-5.385319619,2.0473034858,-4.849225022,-0.396374971,1.873907638,5.456242372,4.3929355881,6.183808373,-3.221352968,-10.37063435,-5.42122175,2.0473034858,-4.849225022,-0.432409059,1.8378709526,5.4203460406,4.3572206647,6.183808373 +050,2,3,18,177,Indiana,Wayne County,68917,68996,68897,68661,68256,67829,67427,67044,66723,66307,66131,65943,65778,-99,-236,-405,-427,-402,-383,-321,-416,-176,-188,-165,172,847,816,803,732,819,757,759,805,763,770,194,734,820,831,870,911,860,896,947,899,935,-22,113,-4,-28,-138,-92,-103,-137,-142,-136,-165,3,-13,8,25,51,40,95,68,112,86,67,-78,-334,-412,-424,-307,-329,-309,-346,-145,-140,-68,-75,-347,-404,-399,-256,-289,-214,-278,-33,-54,-1,-2,-2,3,0,-8,-2,-4,-1,-1,2,1,2700,2699,2699,2698,2699,2699,2704,2703,2703,2704,2705,2705,12.314805391,11.919630141,11.801447625,10.823919087,12.181065062,11.318187595,11.410959934,12.156631782,11.554128746,11.691377988,10.671862051,11.9780597,12.212955138,12.864493997,13.549389831,12.858178774,13.470645719,14.301031426,13.613580266,14.196673272,1.6429433403,-0.05842956,-0.411507514,-2.04057491,-1.368324769,-1.539991179,-2.059685785,-2.144399644,-2.05945152,-2.505295283,-0.189011181,0.116859119,0.3674174229,0.7541255101,0.5949238126,1.4203802134,1.0223257912,1.6913574654,1.3023002256,1.0173017211,-4.856133413,-6.01824463,-6.231399493,-4.539539836,-4.893248358,-4.619973536,-5.201834173,-2.189703861,-2.120023623,-1.032485329,-5.045144594,-5.901385511,-5.86398207,-3.785414325,-4.298324546,-3.199593323,-4.179508382,-0.498346396,-0.817723397,-0.015183608 +050,2,3,18,179,Indiana,Wells County,27636,27637,27680,27737,27707,27716,27817,27854,27863,27934,27982,28131,28142,43,57,-30,9,101,37,9,71,48,149,11,97,330,368,334,339,328,362,349,318,349,335,44,259,268,283,275,313,281,325,318,292,267,53,71,100,51,64,15,81,24,0,57,68,3,18,21,17,28,15,16,13,18,15,11,-10,-33,-151,-59,14,8,-87,36,32,77,-68,-7,-15,-130,-42,42,23,-71,49,50,92,-57,-3,1,0,0,-5,-1,-1,-2,-2,0,0,472,472,472,472,472,472,472,472,472,472,472,472,11.909702799,13.274655508,12.05275788,12.208956836,11.783513858,12.994238742,12.509633134,11.374204163,12.439185216,11.906242781,9.3473121966,9.6674121636,10.212366707,9.9040210325,11.244633651,10.086688084,11.64937183,11.374204163,10.407570438,9.4894532014,2.5623906022,3.6072433446,1.8403911733,2.3049358039,0.5388802069,2.9075506578,0.8602613044,0,2.0316147773,2.4167895794,0.6496201527,0.7575211024,0.6134637244,1.0084094142,0.5388802069,0.5743309941,0.4659748732,0.6438228772,0.5346354677,0.3909512555,-1.19097028,-5.44693745,-2.129079985,0.5042047071,0.287402777,-3.122924781,1.2903919566,1.1445740039,2.7444620676,-2.416789579,-0.541350127,-4.689416348,-1.51561626,1.5126141213,0.826282984,-2.548593786,1.7563668298,1.788396881,3.2790975353,-2.025838324 +050,2,3,18,181,Indiana,White County,24643,24641,24685,24594,24467,24404,24436,24279,24105,24178,24168,24197,24165,44,-91,-127,-63,32,-157,-174,73,-10,29,-32,76,286,294,287,291,275,318,289,302,280,287,34,269,240,299,252,310,284,294,302,291,298,42,17,54,-12,39,-35,34,-5,0,-11,-11,5,7,3,12,19,17,37,25,43,30,26,0,-114,-186,-60,-22,-140,-245,55,-52,12,-48,5,-107,-183,-48,-3,-123,-208,80,-9,42,-22,-3,-1,2,-3,-4,1,0,-2,-1,-2,1,307,307,307,307,307,307,307,307,307,307,307,307,11.607378396,11.985079799,11.745206769,11.916461916,11.290157036,13.14484127,11.971087132,12.493277624,11.578620904,11.868822629,10.917429331,9.7837386111,12.236295554,10.319410319,12.727086113,11.739417989,12.178199366,12.493277624,12.033495296,12.323725239,0.6899490655,2.2013411875,-0.491088785,1.5970515971,-1.436929077,1.4054232804,-0.207112234,0,-0.454874393,-0.454902609,0.284096674,0.1222967326,0.4910887848,0.7780507781,0.6979369804,1.5294312169,1.0355611706,1.778844165,1.2405665254,1.0752243497,-4.626717263,-7.582397424,-2.455443924,-0.900900901,-5.747716309,-10.12731481,2.2782345753,-2.151160386,0.4962266102,-1.985029569,-4.342620589,-7.460100691,-1.964355139,-0.122850123,-5.049779329,-8.597883598,3.3137957459,-0.372316221,1.7367931355,-0.909805219 +050,2,3,18,183,Indiana,Whitley County,33292,33287,33351,33357,33336,33287,33449,33451,33479,33732,34036,33868,34378,64,6,-21,-49,162,2,28,253,304,-168,510,109,389,367,362,410,392,400,411,405,350,356,63,319,309,278,309,321,290,337,316,309,339,46,70,58,84,101,71,110,74,89,41,17,4,18,12,11,18,8,8,10,16,9,9,19,-82,-91,-144,50,-73,-89,172,201,-218,488,23,-64,-79,-133,68,-65,-81,182,217,-209,497,-5,0,0,0,-7,-4,-1,-3,-2,0,-4,436,436,436,436,436,436,436,436,436,436,436,436,11.662769083,11.005652767,10.867117962,12.28722129,11.718983558,11.952786493,12.2301409,11.952543974,10.308671065,10.432845881,9.5640702764,9.2663397958,8.3454662804,9.260369216,9.5964125561,8.6657702077,10.028120397,9.3259355448,9.1010838831,9.9346481845,2.0986988067,1.7393129714,2.5216516819,3.0268520738,2.1225710015,3.2870162857,2.2020205026,2.6266084288,1.2075871819,0.4981976966,0.5396654074,0.3598578561,0.3302162917,0.5394389835,0.2391629297,0.2390557299,0.2975703382,0.4721992681,0.2650801131,0.2637517217,-2.458475745,-2.728922076,-4.322831455,1.4984416207,-2.182361734,-2.659494995,5.1182098168,5.9320033054,-6.420829406,14.301204466,-1.918810338,-2.36906422,-3.992615163,2.0378806042,-1.943198804,-2.420439265,5.415780155,6.4042025735,-6.155749293,14.564956188 +040,2,4,19,000,Iowa,Iowa,3046355,3046877,3050819,3066772,3076844,3093935,3110643,3122541,3133210,3143734,3149900,3159596,3163561,3942,15953,10072,17091,16708,11898,10669,10524,6166,9696,3965,9973,37837,38459,38804,39457,39694,39427,38790,38304,37380,37068,6886,28191,28054,29151,28883,29748,29162,30579,30393,29055,30857,3087,9646,10405,9653,10574,9946,10265,8211,7911,8325,6211,1513,6447,4314,7202,7093,5701,6003,6196,3089,6921,5511,-555,-127,-4637,196,-869,-3653,-5564,-3850,-4825,-5566,-7799,958,6320,-323,7398,6224,2048,439,2346,-1736,1355,-2288,-103,-13,-10,40,-90,-96,-35,-33,-9,16,42,98630,98632,100336,100207,99989,101028,101386,99855,98783,96650,96230,96247,12.369901813,12.519988228,12.576694126,12.718673212,12.736347908,12.605041345,12.359517625,12.172299819,11.848806941,11.724523051,9.2163729154,9.1327322541,9.4480777873,9.3102222262,9.5450415069,9.3232611081,9.7432763459,9.658330942,9.2099273856,9.7599980516,3.1535288972,3.3872559743,3.1286163384,3.4084509857,3.1913064014,3.2817802371,2.6162412792,2.5139688771,2.6388795555,1.9645249991,2.1076923907,1.404384649,2.3342271697,2.2863762854,1.8292416845,1.9191940344,1.9742091056,0.9816268312,2.1938360845,1.7431166109,-0.041519611,-1.50953445,0.0635252048,-0.280115747,-1.172113642,-1.77884318,-1.226711597,-1.53329539,-1.764324757,-2.466805743,2.0661727794,-0.105149801,2.3977523745,2.0062605386,0.6571280424,0.1403508548,0.7474975083,-0.551668559,0.4295113271,-0.723689132 +050,2,4,19,001,Iowa,Adair County,7682,7682,7679,7546,7466,7385,7365,7142,7006,7047,7028,7102,7059,-3,-133,-80,-81,-20,-223,-136,41,-19,74,-43,10,66,78,68,72,63,76,72,87,100,98,16,116,104,118,102,125,114,99,101,83,96,-6,-50,-26,-50,-30,-62,-38,-27,-14,17,2,0,0,1,0,0,3,3,2,1,2,2,4,-83,-56,-32,12,-167,-100,65,-6,57,-46,4,-83,-55,-32,12,-164,-97,67,-5,59,-44,-1,0,1,1,-2,3,-1,1,0,-2,-1,151,151,151,158,162,163,154,151,151,150,154,154,8.6699507389,10.391686651,9.1576324827,9.7627118644,8.6854621907,10.743567995,10.246922365,12.362344583,14.15428167,13.84083045,15.238095238,13.855582201,15.891185779,13.830508475,17.233059902,16.115351993,14.089518252,14.351687389,11.748053786,13.558364522,-6.568144499,-3.46389555,-6.733553296,-4.06779661,-8.547597711,-5.371783998,-3.842595887,-1.989342806,2.4062278839,0.2824659275,0,0.1332267519,0,0,0.4135934377,0.4240882103,0.2846367324,0.1420959147,0.2830856334,0.2824659275,-10.90311987,-7.460698108,-4.309474109,1.6271186441,-23.02336803,-14.13627368,9.250693802,-0.852575488,8.067940552,-6.496716334,-10.90311987,-7.327471356,-4.309474109,1.6271186441,-22.60977459,-13.71218547,9.5353305344,-0.710479574,8.3510261854,-6.214250406 +050,2,4,19,003,Iowa,Adams County,4029,4029,4023,3994,3910,3890,3874,3752,3690,3655,3628,3602,3588,-6,-29,-84,-20,-16,-122,-62,-35,-27,-26,-14,16,32,51,53,52,41,35,45,28,35,36,20,45,52,53,47,63,50,43,43,25,39,-4,-13,-1,0,5,-22,-15,2,-15,10,-3,0,0,0,0,0,0,0,0,0,0,0,-2,-16,-86,-19,-22,-103,-47,-37,-10,-37,-12,-2,-16,-86,-19,-22,-103,-47,-37,-10,-37,-12,0,0,3,-1,1,3,0,0,-2,1,1,114,114,110,113,99,103,84,81,69,69,69,69,7.9830360484,12.9048583,13.58974359,13.395157135,10.752688172,9.4060736361,12.253233492,7.689139091,9.6818810512,10.013908206,11.226144443,13.157894737,13.58974359,12.107161257,16.522423289,13.437248052,11.708645337,11.808320747,6.9156293223,10.848400556,-3.243108395,-0.253036437,0,1.2879958784,-5.769735117,-4.031174415,0.5445881552,-4.119181656,2.7662517289,-0.83449235,0,0,0,0,0,0,0,0,0,0,-3.991518024,-21.7611336,-4.871794872,-5.667181865,-27.01285077,-12.63101317,-10.07488087,-2.746121104,-10.2351314,-3.337969402,-3.991518024,-21.7611336,-4.871794872,-5.667181865,-27.01285077,-12.63101317,-10.07488087,-2.746121104,-10.2351314,-3.337969402 +050,2,4,19,005,Iowa,Allamakee County,14330,14328,14377,14224,14150,14074,14067,13881,13847,13812,13832,13671,13642,49,-153,-74,-76,-7,-186,-34,-35,20,-161,-29,48,159,161,201,174,181,178,207,181,190,174,21,168,155,168,154,166,178,166,177,177,192,27,-9,6,33,20,15,0,41,4,13,-18,22,23,17,19,22,31,34,21,10,32,25,0,-167,-98,-129,-48,-235,-67,-98,7,-205,-35,22,-144,-81,-110,-26,-204,-33,-77,17,-173,-10,0,0,1,1,-1,3,-1,1,-1,-1,-1,332,332,312,309,255,297,301,266,206,217,212,215,11.11849236,11.348417565,14.243197279,12.366298284,12.952626306,12.839007501,14.968003182,13.095065837,13.816674545,12.741185516,11.747840985,10.925495172,11.904761905,10.944884688,11.879204236,12.839007501,12.003326223,12.805672117,12.871323128,14.05923919,-0.629348624,0.4229223937,2.3384353741,1.4214135958,1.0734220696,0,2.9646769587,0.2893937202,0.9453514162,-1.318053674,1.6083353729,1.1982801156,1.3463718821,1.5635549554,2.2184056104,2.4523946913,1.5184930764,0.7234843004,2.3270188707,1.8306301029,-11.67791336,-6.907732431,-9.141156463,-3.41139263,-16.81694576,-4.832660127,-7.086301023,0.5064390103,-14.90746464,-2.562882144,-10.06957799,-5.709452316,-7.79478458,-1.847837675,-14.59854015,-2.380265436,-5.567807947,1.2299233107,-12.58044577,-0.732252041 +050,2,4,19,007,Iowa,Appanoose County,12887,12892,12861,12853,12713,12659,12678,12587,12515,12367,12467,12525,12430,-31,-8,-140,-54,19,-91,-72,-148,100,58,-95,30,153,171,136,152,145,153,131,140,134,143,59,153,168,174,168,179,170,157,177,167,172,-29,0,3,-38,-16,-34,-17,-26,-37,-33,-29,1,2,1,3,7,4,5,6,4,5,5,-1,-10,-146,-17,32,-61,-58,-128,135,86,-71,0,-8,-145,-14,39,-57,-53,-122,139,91,-66,-2,0,2,-2,-4,0,-2,0,-2,0,0,126,126,142,127,125,126,126,121,131,121,118,118,11.900132224,13.377141516,10.720479268,11.998263409,11.478329705,12.190263724,10.529700185,11.274865104,10.723431498,11.460629132,11.900132224,13.142454823,13.715907299,13.261238505,14.169800119,13.544737471,12.619564344,14.254650882,13.364276569,13.784812663,0,0.2346866933,-2.995428031,-1.262975096,-2.691470414,-1.354473747,-2.089864159,-2.979785778,-2.64084507,-2.32418353,0.155557284,0.0782288978,0.2364811603,0.5525516044,0.3166435781,0.3983746315,0.4822763443,0.322139003,0.400128041,0.4007212983,-0.77778642,-11.42141907,-1.340059909,2.5259501914,-4.828814566,-4.621145725,-10.28856201,10.872191351,6.8822023047,-5.690242436,-0.622229136,-11.34319017,-1.103578748,3.0785017958,-4.512170988,-4.222771094,-9.806285668,11.194330354,7.2823303457,-5.289521138 +050,2,4,19,009,Iowa,Audubon County,6119,6115,6094,6000,5861,5859,5768,5707,5625,5550,5482,5491,5481,-21,-94,-139,-2,-91,-61,-82,-75,-68,9,-10,15,61,54,59,63,68,67,57,65,54,58,31,83,95,68,81,74,83,88,75,81,74,-16,-22,-41,-9,-18,-6,-16,-31,-10,-27,-16,0,0,1,2,1,1,1,2,1,2,1,-4,-74,-100,6,-75,-56,-66,-47,-58,35,4,-4,-74,-99,8,-74,-55,-65,-45,-57,37,5,-1,2,1,-1,1,0,-1,1,-1,-1,1,136,136,147,137,138,137,117,115,122,115,116,116,10.087646767,9.105471714,10.068259386,10.836845274,11.851851852,11.824920579,10.201342282,11.783901378,9.8423402898,10.572366023,13.725814453,16.018885423,11.604095563,13.933086781,12.897603486,14.64878221,15.749440716,13.596809282,14.763510435,13.488880787,-3.638167686,-6.913413709,-1.535836177,-3.096241507,-1.045751634,-2.823861631,-5.548098434,-1.812907904,-4.921170145,-2.916514765,0,0.1686198466,0.3412969283,0.172013417,0.174291939,0.1764913519,0.3579418345,0.1812907904,0.3645311218,0.1822821728,-12.23747313,-16.86198466,1.023890785,-12.90100628,-9.760348584,-11.64842923,-8.41163311,-10.51486584,6.3792946323,0.7291286912,-12.23747313,-16.69336481,1.3651877133,-12.72899286,-9.586056645,-11.47193788,-8.053691275,-10.33357505,6.7438257541,0.911410864 +050,2,4,19,011,Iowa,Benton County,26076,26071,26049,26079,25829,25698,25620,25608,25634,25651,25546,25544,25414,-22,30,-250,-131,-78,-12,26,17,-105,-2,-130,74,289,248,289,274,319,297,322,283,282,284,86,223,193,243,208,239,232,236,276,247,259,-12,66,55,46,66,80,65,86,7,35,25,6,2,4,4,5,9,9,8,2,7,7,-15,-37,-318,-183,-150,-102,-45,-77,-113,-44,-161,-9,-35,-314,-179,-145,-93,-36,-69,-111,-37,-154,-1,-1,9,2,1,1,-3,0,-1,0,-1,313,313,309,318,306,290,298,314,313,305,311,311,11.088090853,9.5553671881,11.217419993,10.678514361,12.454126649,11.592053394,12.557277957,11.055335274,11.039342337,11.146434318,8.5558624923,7.4362333359,9.431948299,8.1063174715,9.3308346998,9.0550720112,9.2034708004,10.781881751,9.6692111959,10.165234114,2.532228361,2.1191338522,1.7854716945,2.57219689,3.1232919497,2.5369813825,3.3538071561,0.2734535227,1.3701311411,0.9812002041,0.0767341928,0.1541188256,0.1552584082,0.1948634008,0.3513703443,0.3512743453,0.311982061,0.0781295779,0.2740262282,0.2747360571,-1.419582566,-12.25244664,-7.103072176,-5.845902023,-3.982197236,-1.756371726,-3.002827337,-4.414321152,-1.722450577,-6.318929314,-1.342848373,-12.09832781,-6.947813768,-5.651038622,-3.630826892,-1.405097381,-2.690845276,-4.336191574,-1.448424349,-6.044193257 +050,2,4,19,013,Iowa,Black Hawk County,131090,131086,131164,131598,131904,132966,133433,133764,133144,132278,131769,131089,130786,78,434,306,1062,467,331,-620,-866,-509,-680,-303,428,1663,1656,1754,1728,1777,1746,1656,1698,1644,1594,327,1138,1166,1201,1222,1186,1172,1296,1226,1264,1282,101,525,490,553,506,591,574,360,472,380,312,36,265,188,357,437,337,302,318,176,357,280,-41,-351,-350,167,-451,-589,-1498,-1550,-1159,-1418,-895,-5,-86,-162,524,-14,-252,-1196,-1232,-983,-1061,-615,-18,-5,-22,-15,-25,-8,2,6,2,1,0,5967,5967,5832,5622,5552,5507,5516,5535,4974,4589,4254,4256,12.657842458,12.56916456,13.24423302,12.973021671,13.301047542,13.08315974,12.478242195,12.861346654,12.508654863,12.173747017,8.6618308583,8.8500277038,9.0685996904,9.1742086119,8.8773451798,8.7820522427,9.7655808486,9.2862255583,9.6173599434,9.7909307876,3.9960115999,3.7191368566,4.1756333296,3.7988130586,4.4237023619,4.3011074977,2.7126613468,3.5751210959,2.8912949197,2.3828162291,2.0170344266,1.4269341409,2.6956620229,3.2807930961,2.5224834111,2.2629520284,2.3961841897,1.3330960018,2.7162954903,2.138424821,-2.671619184,-2.656526326,1.2609959603,-3.385898596,-4.408732134,-11.22484152,-11.67951413,-8.778740149,-10.78909525,-6.835322196,-0.654584757,-1.229592185,3.9566579832,-0.1051055,-1.886248723,-8.96188949,-9.283329943,-7.445644147,-8.072799763,-4.696897375 +050,2,4,19,015,Iowa,Boone County,26306,26308,26271,26287,26138,26294,26303,26468,26434,26498,26356,26338,26277,-37,16,-149,156,9,165,-34,64,-142,-18,-61,75,315,306,322,270,288,277,283,278,276,262,87,289,290,307,294,281,315,285,316,287,318,-12,26,16,15,-24,7,-38,-2,-38,-11,-56,1,-1,-1,0,-4,-5,-1,-1,-1,4,7,-24,-9,-163,144,43,165,6,68,-103,-11,-13,-23,-10,-164,144,39,160,5,67,-104,-7,-6,-2,0,-1,-3,-6,-2,-1,-1,0,0,1,768,768,774,775,755,765,752,750,737,721,722,722,11.986757487,11.673819742,12.282575526,10.266745252,10.915085937,10.472193868,10.692964558,10.519544405,10.475575967,9.9591371282,10.997374329,11.063423939,11.710405859,11.17934483,10.64978871,11.908812521,10.768533212,11.957467741,10.893080806,12.087807659,0.9893831577,0.6103958035,0.5721696674,-0.912599578,0.2652972276,-1.436618653,-0.075568654,-1.437923336,-0.417504839,-2.128670531,-0.038053198,-0.038149738,0,-0.15209993,-0.18949802,-0.037805754,-0.037784327,-0.037840088,0.1518199415,0.2660838164,-0.342478785,-6.218407248,5.4928288068,1.6350742438,6.2534346516,0.2268345242,2.5693342402,-3.897529042,-0.417504839,-0.494155659,-0.380531984,-6.256556986,5.4928288068,1.4829743141,6.0639366319,0.1890287702,2.5315499131,-3.93536913,-0.265684898,-0.228071843 +050,2,4,19,017,Iowa,Bremer County,24276,24280,24296,24383,24499,24585,24678,24755,24796,24861,25022,25170,25311,16,87,116,86,93,77,41,65,161,148,141,49,229,262,244,261,266,300,243,295,253,264,44,210,196,215,204,226,212,238,230,231,239,5,19,66,29,57,40,88,5,65,22,25,2,10,12,41,38,32,42,57,34,56,47,11,60,44,19,-3,7,-89,4,63,73,69,13,70,56,60,35,39,-47,61,97,129,116,-2,-2,-6,-3,1,-2,0,-1,-1,-3,0,1718,1718,1784,1734,1730,1643,1608,1605,1581,1579,1580,1581,9.4085745393,10.71969232,9.9421400049,10.596187808,10.762041551,12.108736453,9.7871397789,11.827676764,10.081287855,10.459380757,8.6279504509,8.0193118121,8.7604922174,8.2820778272,9.1436894382,8.556840427,9.585758302,9.2215784937,9.2046541281,9.4689090945,0.7806240884,2.7003805082,1.1816477875,2.3141099811,1.618352113,3.5518960263,0.2013814769,2.60609827,0.8766337265,0.9904716626,0.4108547834,0.4909782742,1.6706054926,1.5427399874,1.2946816904,1.6952231035,2.295748837,1.3631898643,2.2314313038,1.8620867257,2.4651287003,1.8002536721,0.7741830332,-0.121795262,0.2832116198,-3.592258481,0.1611051815,2.5259106309,2.9088300924,2.7337017888,2.8759834836,2.2912319463,2.4447885258,1.4209447253,1.5778933101,-1.897035378,2.4568540186,3.8891004952,5.1402613962,4.5957885145 +050,2,4,19,019,Iowa,Buchanan County,20958,20953,20975,20911,20995,21028,21135,21110,20999,21133,21140,21148,21287,22,-64,84,33,107,-25,-111,134,7,8,139,81,274,295,284,289,287,276,284,274,281,274,28,217,198,214,218,216,203,217,225,193,203,53,57,97,70,71,71,73,67,49,88,71,1,5,3,11,7,9,8,7,3,5,3,-31,-124,-14,-46,32,-104,-192,60,-44,-85,66,-30,-119,-11,-35,39,-95,-184,67,-41,-80,69,-1,-2,-2,-2,-3,-1,0,0,-1,0,-1,343,343,333,323,331,330,324,305,305,311,309,310,13.083130402,14.07912948,13.516407682,13.708701942,13.587406794,13.108836591,13.481439286,12.963357226,13.289822172,12.913868269,10.361457289,9.4497208037,10.184898746,10.34082015,10.226062256,9.6416443041,10.300958891,10.645092612,9.1278849792,9.5675739366,2.7216731127,4.6294086766,3.3315089356,3.3678817921,3.3613445378,3.4671922867,3.1804803949,2.3182646133,4.1619371926,3.3462943325,0.2387432555,0.1431775879,0.5235228327,0.3320446837,0.4260859273,0.379966278,0.3322889965,0.1419345682,0.2364737041,0.1413927183,-5.920832736,-0.668162077,-2.189277301,1.5179185542,-4.923659605,-9.119190672,2.8481913985,-2.081707,-4.02005297,3.1106398021,-5.682089481,-0.524984489,-1.665754468,1.8499632379,-4.497573677,-8.739224394,3.1804803949,-1.939772432,-3.783579266,3.2520325203 +050,2,4,19,021,Iowa,Buena Vista County,20260,20265,20356,20310,20558,20649,20608,20373,20327,20154,19807,19690,19772,91,-46,248,91,-41,-235,-46,-173,-347,-117,82,86,297,322,335,342,300,294,321,292,295,288,33,228,168,186,204,195,186,172,185,154,147,53,69,154,149,138,105,108,149,107,141,141,27,64,48,121,86,95,114,102,37,116,90,14,-180,49,-180,-270,-440,-269,-427,-493,-373,-148,41,-116,97,-59,-184,-345,-155,-325,-456,-257,-58,-3,1,-3,1,5,5,1,3,2,-1,-1,1014,1014,970,977,989,939,970,877,825,784,796,796,14.606796833,15.758050308,16.259373407,16.579004775,14.640931163,14.447174447,15.859292014,14.614248893,14.937843381,14.596320511,11.213298579,8.2215914652,9.0275923993,9.8892309184,9.5166052561,9.14004914,8.4978137892,9.2590275519,7.7980606122,7.4502052608,3.3934982541,7.5364588431,7.2317810081,6.6897738566,5.1243259071,5.3071253071,7.3614782244,5.3552213408,7.1397827683,7.1461152501,3.1475925835,2.3490261329,5.8727886039,4.1689895048,4.6362948684,5.601965602,5.0394012006,1.8518055104,5.8738638378,4.5613501596,-8.852604141,2.3979641774,-8.736379741,-13.08868798,-21.47336571,-13.21867322,-21.09631679,-24.67405721,-18.88751044,-7.500886929,-5.705011558,4.7469903103,-2.863591137,-8.919698475,-16.83707084,-7.616707617,-16.05691559,-22.8222517,-13.01364661,-2.93953677 +050,2,4,19,023,Iowa,Butler County,14867,14869,14916,14966,14972,14973,14958,14880,14694,14593,14516,14404,14333,47,50,6,1,-15,-78,-186,-101,-77,-112,-71,39,152,173,158,162,157,134,135,135,156,152,42,183,174,184,183,190,178,185,205,201,192,-3,-31,-1,-26,-21,-33,-44,-50,-70,-45,-40,2,5,8,11,14,8,11,11,3,10,7,48,76,2,18,-7,-51,-152,-62,-9,-78,-38,50,81,10,29,7,-43,-141,-51,-6,-68,-31,0,0,-3,-2,-1,-2,-1,0,-1,1,0,242,242,236,227,229,231,227,211,205,209,211,211,10.173348504,11.557218251,10.552679913,10.824897264,10.523493532,9.0620139312,9.2191074538,9.2754818097,10.788381743,10.578696454,12.24817616,11.624022981,12.289196861,12.228124687,12.735438032,12.037600595,12.633591696,14.084990896,13.900414938,13.362563942,-2.074827655,-0.06680473,-1.736516948,-1.403227423,-2.2119445,-2.975586664,-3.414484242,-4.809509087,-3.112033195,-2.783867488,0.3346496218,0.5344378382,0.7346802471,0.9354849487,0.5362289698,0.743896666,0.7511865333,0.206121818,0.6915629322,0.4871768104,5.0866742521,0.1336094595,1.2022040407,-0.467742474,-3.418459682,-10.27929938,-4.23396046,-0.618365454,-5.394190871,-2.644674114,5.4213238739,0.6680472977,1.9368842879,0.4677424744,-2.882230713,-9.535402719,-3.482773927,-0.412243636,-4.702627939,-2.157497303 +050,2,4,19,025,Iowa,Calhoun County,9670,10177,10159,10064,9912,9899,9845,9801,9808,9730,9653,9616,9473,-18,-95,-152,-13,-54,-44,7,-78,-77,-37,-143,27,91,115,125,105,119,110,102,103,108,103,44,155,125,151,145,144,139,148,136,105,142,-17,-64,-10,-26,-40,-25,-29,-46,-33,3,-39,0,3,0,0,5,5,5,9,4,11,7,-1,-32,-146,16,-19,-23,32,-41,-47,-51,-110,-1,-29,-146,16,-14,-18,37,-32,-43,-40,-103,0,-2,4,-3,0,-1,-1,0,-1,0,-1,745,745,743,742,738,737,729,730,719,728,721,723,8.9996538595,11.51381658,12.619251931,10.636142626,12.114425328,11.219338059,10.441191524,10.627869783,11.209715086,10.791555346,15.32908075,12.515018022,15.244056332,14.688006483,14.659472666,14.177163547,15.149964172,14.032915441,10.898334112,14.877678244,-6.32942689,-1.001201442,-2.624804402,-4.051863857,-2.545047338,-2.957825488,-4.708772648,-3.405045659,0.3113809746,-4.086122898,0.2966918855,0,0,0.5064829822,0.5090094676,0.5099699118,0.9212816051,0.4127328071,1.1417302403,0.733406674,-3.164713445,-14.61754105,1.6152642471,-1.924635332,-2.341443551,3.2638074354,-4.196949534,-4.849610483,-5.293476569,-11.52496202,-2.86802156,-14.61754105,1.6152642471,-1.41815235,-1.832434083,3.7737773471,-3.275667929,-4.436877676,-4.151746328,-10.79155535 +050,2,4,19,027,Iowa,Carroll County,20816,20816,20823,20860,20653,20539,20495,20421,20362,20256,20101,20118,19914,7,37,-207,-114,-44,-74,-59,-106,-155,17,-204,53,262,292,223,271,276,249,268,240,226,225,47,227,264,227,255,248,245,266,241,206,242,6,35,28,-4,16,28,4,2,-1,20,-17,1,7,1,7,5,6,5,3,3,5,5,2,-4,-241,-119,-63,-108,-67,-112,-157,-7,-191,3,3,-240,-112,-58,-102,-62,-109,-154,-2,-186,-2,-1,5,2,-2,0,-1,1,0,-1,-1,467,467,468,466,465,462,461,441,405,385,399,398,12.57107214,14.06788235,10.827345116,13.208558756,13.491054844,12.210970257,13.196119947,11.893847412,11.23846938,11.241007194,10.891730442,12.71890733,11.021557584,12.428717649,12.122397106,12.014810092,13.09764144,11.943405109,10.243914568,12.090327738,1.6793416981,1.3489750199,-0.194212468,0.7798411074,1.3686577378,0.1961601648,0.0984785071,-0.049557698,0.9945548124,-0.849320544,0.3358683396,0.0481776793,0.3398718198,0.2437003461,0.293283801,0.245200206,0.1477177606,0.1486730926,0.2486387031,0.2498001599,-0.191924765,-11.61082071,-5.777820936,-3.07062436,-5.279108417,-3.28568276,-5.514796396,-7.780558515,-0.348094184,-9.542366107,0.1439435741,-11.56264303,-5.437949116,-2.826924014,-4.985824616,-3.040482554,-5.367078635,-7.631885423,-0.099455481,-9.292565947 +050,2,4,19,029,Iowa,Cass County,13956,13952,13927,13762,13697,13569,13394,13354,13198,13155,12959,12822,12817,-25,-165,-65,-128,-175,-40,-156,-43,-196,-137,-5,44,147,153,155,140,132,149,132,144,138,136,74,183,203,176,202,191,197,200,192,201,184,-30,-36,-50,-21,-62,-59,-48,-68,-48,-63,-48,5,3,1,1,0,2,17,17,9,16,13,2,-130,-14,-108,-114,19,-126,10,-156,-91,30,7,-127,-13,-107,-114,21,-109,27,-147,-75,43,-2,-2,-2,0,1,-2,1,-2,-1,1,0,304,304,297,301,300,305,304,297,299,296,291,291,10.61793492,11.14388725,11.369471136,10.38460112,9.8698968147,11.223260018,10.017834782,11.028567052,10.705558357,10.608838098,13.218245513,14.785680469,12.909851097,14.983495902,14.281441603,14.83880687,15.178537548,14.70475607,15.592878476,14.353133898,-2.600310593,-3.641793219,-1.54037996,-4.598894782,-4.411544788,-3.615546851,-5.160702766,-3.676189017,-4.887320119,-3.744295799,0.2166925494,0.0728358644,0.0733514267,0,0.1495438911,1.2805061766,1.2901756916,0.6892854408,1.2412241573,1.0140801123,-9.390010473,-1.019702101,-7.921954082,-8.456032341,1.4206669658,-9.490810485,0.7589268774,-11.94761431,-7.059462395,2.3401848746,-9.173317924,-0.946866237,-7.848602655,-8.456032341,1.5702108569,-8.210304309,2.049102569,-11.25832887,-5.818238237,3.3542649869 +050,2,4,19,031,Iowa,Cedar County,18499,18445,18453,18362,18299,18229,18278,18257,18351,18488,18508,18541,18485,8,-91,-63,-70,49,-21,94,137,20,33,-56,34,200,179,170,177,196,186,177,184,185,172,28,191,170,162,174,198,189,163,185,180,195,6,9,9,8,3,-2,-3,14,-1,5,-23,2,5,5,14,14,5,0,2,-1,1,1,1,-105,-77,-91,35,-23,98,123,22,28,-36,3,-100,-72,-77,49,-18,98,125,21,29,-35,-1,0,0,-1,-3,-1,-1,-2,0,-1,2,324,324,324,323,318,319,316,314,312,320,319,319,10.865136493,9.7651455225,9.3079281647,9.6967704824,10.729437526,10.161713287,9.6093813621,9.9470212996,9.9867742719,9.2907686491,10.376205351,9.2741605521,8.8699080158,9.5324184403,10.838921582,10.325611888,8.8493172996,10.001081198,9.7168614538,10.533138875,0.4889311422,0.4909849704,0.4380201489,0.1643520421,-0.109484056,-0.163898601,0.7600640625,-0.054059898,0.2699128182,-1.242370226,0.2716284123,0.272769428,0.7665352606,0.7669761963,0.273710141,0,0.1085805804,-0.054059898,0.0539825636,0.0540160968,-5.704196659,-4.200649191,-4.982479194,1.9174404909,-1.259066648,5.354020979,6.6777056923,1.1893177641,1.5115117817,-1.944579485,-5.432568247,-3.927879763,-4.215943933,2.6844166872,-0.985356507,5.354020979,6.7862862727,1.1352578657,1.5654943453,-1.890563388 +050,2,4,19,033,Iowa,Cerro Gordo County,44151,44151,44097,43971,43704,43537,43224,43006,43107,43030,42643,42477,42103,-54,-126,-267,-167,-313,-218,101,-77,-387,-166,-374,125,477,486,446,499,485,438,461,445,473,462,134,464,502,465,512,529,546,510,526,508,541,-9,13,-16,-19,-13,-44,-108,-49,-81,-35,-79,10,21,29,46,33,26,38,22,10,38,34,-51,-159,-281,-192,-331,-200,175,-47,-317,-169,-327,-41,-138,-252,-146,-298,-174,213,-25,-307,-131,-293,-4,-1,1,-2,-2,0,-4,-3,1,0,-2,1158,1158,1175,1132,1144,1108,1124,1175,1181,1155,1131,1132,10.832538493,11.086398631,10.224550383,11.50286419,11.248985272,10.172680083,10.703878705,10.388337049,11.113721805,10.924568456,10.537312077,11.451382948,10.6601254,11.802538007,12.269511771,12.681012158,11.84160117,12.279247838,11.936090226,12.792622369,0.295226416,-0.364984317,-0.435575016,-0.299673817,-1.020526499,-2.508332075,-1.137722465,-1.890910789,-0.822368421,-1.868053913,0.4769042104,0.6615340747,1.0545500395,0.7607104575,0.6030383857,0.8825612858,0.5108141681,0.2334457764,0.8928571429,0.8039725703,-3.610846164,-6.410037069,-4.401600165,-7.630156407,-4.638756813,4.0644269739,-1.091284814,-7.400231111,-3.970864662,-7.732324427,-3.133941954,-5.748502994,-3.347050126,-6.869445949,-4.035718427,4.9469882596,-0.580470646,-7.166785335,-3.078007519,-6.928351856 +050,2,4,19,035,Iowa,Cherokee County,12072,12067,12110,12027,11954,11876,11803,11488,11386,11315,11281,11231,11190,43,-83,-73,-78,-73,-315,-102,-71,-34,-50,-41,17,112,136,140,143,130,117,136,112,109,114,21,156,172,162,160,163,171,166,152,151,170,-4,-44,-36,-22,-17,-33,-54,-30,-40,-42,-56,1,1,0,2,10,5,7,10,6,9,8,45,-40,-36,-60,-68,-291,-54,-50,1,-16,6,46,-39,-36,-58,-58,-286,-47,-40,7,-7,14,1,0,-1,2,2,4,-1,-1,-1,-1,1,371,371,368,368,367,362,363,348,353,366,360,361,9.2803579567,11.342312664,11.74989509,12.078212762,11.163110214,10.229955408,11.98185102,9.9132589839,9.683724236,10.169037955,12.926212868,14.344689546,13.596307176,13.51408421,13.996822807,14.951473288,14.624906392,13.453708621,13.41506752,15.164354846,-3.645854912,-3.002376882,-1.846412086,-1.435871447,-2.833712593,-4.721517881,-2.643055372,-3.540449637,-3.731343284,-4.99531689,0.0828603389,0,0.1678556441,0.8446302631,0.4293503929,0.6120486141,0.8810184573,0.5310674456,0.7995735608,0.7136166986,-3.314413556,-3.002376882,-5.035669324,-5.743485789,-24.98819286,-4.721517881,-4.405092287,0.0885112409,-1.421464108,0.535212524,-3.231553217,-3.002376882,-4.86781368,-4.898855526,-24.55884247,-4.109469266,-3.524073829,0.6195786865,-0.621890547,1.2488292226 +050,2,4,19,037,Iowa,Chickasaw County,12439,12442,12411,12407,12289,12273,12250,12152,12098,12008,11965,11943,11834,-31,-4,-118,-16,-23,-98,-54,-90,-43,-22,-109,47,137,149,136,140,127,133,146,153,128,139,54,135,124,151,127,136,130,156,125,126,131,-7,2,25,-15,13,-9,3,-10,28,2,8,-1,0,0,1,9,13,14,2,10,26,21,-24,-5,-145,1,-44,-102,-71,-83,-81,-50,-138,-25,-5,-145,2,-35,-89,-57,-81,-71,-24,-117,1,-1,2,-3,-1,0,0,1,0,0,0,183,183,179,178,102,105,99,99,95,101,90,90,11.040373922,12.066731454,11.074016774,11.417852628,10.40898287,10.969072165,12.113166846,12.764359905,10.707712899,11.691971233,10.87920058,10.042112083,12.295415683,10.357623456,11.146627326,10.721649485,12.942835809,10.428398615,10.540404885,11.019052025,0.1611733419,2.0246193716,-1.221398909,1.0602291726,-0.737644455,0.2474226804,-0.829668962,2.3359612898,0.1673080141,0.6729192076,0,0,0.0814265939,0.7340048118,1.0654864355,1.1546391753,0.1659337924,0.8342718892,2.1750041827,1.76641292,-0.402933355,-11.74279236,0.0814265939,-3.588467969,-8.359970494,-5.855670103,-6.886252385,-6.757602303,-4.182700351,-11.60785633,-0.402933355,-11.74279236,0.1628531879,-2.854463157,-7.294484059,-4.701030928,-6.720318593,-5.923330413,-2.007696169,-9.841443412 +050,2,4,19,039,Iowa,Clarke County,9286,9286,9321,9318,9339,9244,9192,9213,9293,9395,9489,9382,9353,35,-3,21,-95,-52,21,80,102,94,-107,-29,35,115,126,130,120,126,128,125,129,115,121,11,111,128,107,115,105,110,106,115,107,111,24,4,-2,23,5,21,18,19,14,8,10,1,0,-2,11,3,11,35,32,22,53,39,11,-7,27,-129,-60,-11,28,51,59,-166,-78,12,-7,25,-118,-57,0,63,83,81,-113,-39,-1,0,-2,0,0,0,-1,0,-1,-2,0,152,152,139,148,139,151,155,155,156,156,156,156,12.339717796,13.506994694,13.991282355,13.018008245,13.69193154,13.833351346,13.377568493,13.66235967,12.188013354,12.917000267,11.910510221,13.721391435,11.515901631,12.475591235,11.40994295,11.888036313,11.344178082,12.179622961,11.340151555,11.849479584,0.4292075755,-0.214396741,2.4753807243,0.5424170102,2.2819885901,1.945315033,2.033390411,1.4827367083,0.8478617985,1.0675206832,0,-0.214396741,1.1838777377,0.3254502061,1.1953273567,3.7825570085,3.4246575342,2.3300148274,5.6170844152,4.1633306645,-0.751113257,2.8943560058,-13.88365711,-6.509004122,-1.195327357,3.0260456068,5.4580479452,6.2486761279,-17.59313232,-8.326661329,-0.751113257,2.6799592646,-12.69977937,-6.183553916,0,6.8086026154,8.8827054795,8.5786909553,-11.9760479,-4.163330665 +050,2,4,19,041,Iowa,Clay County,16667,16667,16633,16598,16540,16440,16483,16498,16301,16151,16167,16094,15976,-34,-35,-58,-100,43,15,-197,-150,16,-73,-118,55,199,178,223,191,212,180,184,208,191,186,61,194,193,191,199,204,199,160,181,189,191,-6,5,-15,32,-8,8,-19,24,27,2,-5,0,-3,-2,7,5,9,16,10,6,13,10,-27,-36,-39,-142,50,2,-196,-183,-17,-89,-123,-27,-39,-41,-135,55,11,-180,-173,-11,-76,-113,-1,-1,-2,3,-4,-4,2,-1,0,1,0,234,234,251,247,252,253,254,234,235,214,215,215,11.97676868,10.742953709,13.523347483,11.602830848,12.855886723,10.975944389,11.339824972,12.872083669,11.840922476,11.599625819,11.675844844,11.648258797,11.582777441,12.088813292,12.370758922,12.134516296,9.8607173672,11.201188192,11.716933759,11.911443717,0.3009238362,-0.905305088,1.9405700424,-0.485982444,0.4851278009,-1.158571908,1.4791076051,1.6708954762,0.123988717,-0.311817898,-0.180554302,-0.120707345,0.4244996968,0.3037390274,0.545768776,0.9756395012,0.6162948354,0.3713101058,0.8059266607,0.6236357967,-2.16665162,-2.353793228,-8.611279563,3.0373902743,0.1212819502,-11.95158389,-11.27819549,-1.0520453,-5.517497908,-7.670720299,-2.347205922,-2.474500573,-8.186779867,3.3411293017,0.6670507262,-10.97594439,-10.66190065,-0.680735194,-4.711571247,-7.047084503 +050,2,4,19,043,Iowa,Clayton County,18129,18128,18080,18019,17947,17793,17771,17726,17657,17647,17515,17497,17321,-48,-61,-72,-154,-22,-45,-69,-10,-132,-18,-176,46,179,189,198,208,189,172,200,181,178,176,61,207,166,214,184,197,189,216,203,188,210,-15,-28,23,-16,24,-8,-17,-16,-22,-10,-34,1,3,3,7,9,8,16,14,8,15,10,-34,-35,-99,-144,-55,-44,-67,-6,-118,-23,-150,-33,-32,-96,-137,-46,-36,-51,8,-110,-8,-140,0,-1,1,-1,0,-1,-1,-2,0,0,-2,287,287,280,288,270,282,276,276,270,256,255,255,9.9171722208,10.509926041,11.080022384,11.69722191,10.648787221,9.7221829692,11.330160888,10.295205051,10.16794242,10.109713367,11.46846173,9.2309403325,11.975377728,10.347542459,11.099529538,10.683096402,12.236573759,11.546555941,10.73917514,12.062726176,-1.551289509,1.2789857087,-0.895355344,1.3496794511,-0.450742316,-0.960913433,-0.906412871,-1.25135089,-0.57123272,-1.953012809,0.1662095903,0.1668242229,0.3917179631,0.5061297942,0.4507423163,0.9043891134,0.7931112622,0.4550366873,0.8568490803,0.5744155322,-1.939111887,-5.505199355,-8.058198097,-3.093015409,-2.479082739,-3.787129412,-0.339904827,-6.711791138,-1.313835256,-8.616232983,-1.772902296,-5.338375132,-7.666480134,-2.586885615,-2.028340423,-2.882740299,0.4532064355,-6.256754451,-0.456986176,-8.041817451 +050,2,4,19,045,Iowa,Clinton County,49116,49113,49091,49105,48711,48297,47921,47593,47285,46926,46506,46559,46392,-22,14,-394,-414,-376,-328,-308,-359,-420,53,-167,166,597,572,560,538,590,583,547,519,529,516,164,539,531,545,527,564,576,607,582,528,529,2,58,41,15,11,26,7,-60,-63,1,-13,7,23,20,54,40,46,48,37,12,49,37,-24,-65,-465,-492,-431,-404,-363,-336,-368,3,-192,-17,-42,-445,-438,-391,-358,-315,-299,-356,52,-155,-7,-2,10,9,4,4,0,0,-1,0,1,852,852,980,950,870,807,633,635,627,629,633,633,12.15935476,11.695428151,11.545439551,11.182938743,12.354209854,12.289466473,11.612232117,11.109684048,11.368398431,11.102623963,10.978043912,10.85711949,11.236186706,10.954291297,11.809787047,12.141908556,12.88596873,12.458258413,11.346908075,11.382341234,1.1813108477,0.8383086612,0.3092528451,0.2286474464,0.5444228071,0.1475579165,-1.273736612,-1.348574364,0.0214903562,-0.27971727,0.4684508534,0.4089310542,1.1133102425,0.8314452597,0.9632095818,1.011825713,0.785470911,0.2568713075,1.0530274539,0.796118385,-1.323882847,-9.507647011,-10.14349332,-8.958822674,-8.459492849,-7.651931955,-7.13292503,-7.877386763,0.0644710686,-4.131208917,-0.855431993,-9.098715956,-9.030183078,-8.127377414,-7.496283267,-6.640106242,-6.347454119,-7.620515455,1.1174985225,-3.335090532 +050,2,4,19,047,Iowa,Crawford County,17096,17091,17166,17213,17292,17351,17156,17069,17107,17065,17081,16903,16834,75,47,79,59,-195,-87,38,-42,16,-178,-69,91,231,259,204,251,210,251,231,220,224,217,49,183,139,154,166,164,165,188,165,159,157,42,48,120,50,85,46,86,43,55,65,60,22,20,15,34,32,83,86,26,50,163,123,13,-21,-55,-20,-317,-218,-133,-112,-88,-406,-250,35,-1,-40,14,-285,-135,-47,-86,-38,-243,-127,-2,0,-1,-5,5,2,-1,1,-1,0,-2,585,585,580,568,567,579,575,567,565,551,536,535,13.438436255,15.012317055,11.777271022,14.547772916,12.271731191,14.688670412,13.519840805,12.885843144,13.1826742,12.864214364,10.646033916,8.0568033618,8.8906849869,9.6212362709,9.5836376917,9.6558988764,11.003160482,9.6643823581,9.3573446328,9.3072887334,2.7924023386,6.9555136937,2.8865860347,4.9265366447,2.6880934989,5.0327715356,2.5166803231,3.221460786,3.8253295669,3.5569256306,1.1635009744,0.8694392117,1.9628785036,1.8546961486,4.8502556611,5.0327715356,1.5217136837,2.9286007146,9.5927495292,7.2916975428,-1.221676023,-3.187943776,-1.154634414,-18.37308372,-12.73922571,-7.7832397,-6.55507433,-5.154337258,-23.89359699,-14.82052346,-0.058175049,-2.318504565,0.8082440897,-16.51838757,-7.888970051,-2.750468165,-5.033360646,-2.225736543,-14.30084746,-7.528825918 +050,2,4,19,049,Iowa,Dallas County,66135,66139,66751,69699,72248,74968,77758,80658,84278,87219,89999,93631,96963,612,2948,2549,2720,2790,2900,3620,2941,2780,3632,3332,287,1009,1131,1221,1190,1257,1285,1318,1222,1279,1309,59,353,374,371,417,423,450,509,501,524,538,228,656,757,850,773,834,835,809,721,755,771,33,233,213,296,319,255,207,239,122,221,181,325,2043,1528,1536,1654,1787,2562,1883,1930,2658,2387,358,2276,1741,1832,1973,2042,2769,2122,2052,2879,2568,26,16,51,38,44,24,16,10,7,-2,-7,516,516,493,509,500,516,699,701,677,688,692,692,14.78930011,15.935525231,16.587870884,15.583463196,15.86960913,15.581801426,15.370531263,13.790924172,13.9301857,13.736004281,5.1740564309,5.2695724461,5.0402130203,5.460759792,5.3403696596,5.456661978,5.9359638944,5.6540532,5.7071284648,5.6455082531,9.615243679,10.665952785,11.547657863,10.122703403,10.529239471,10.125139448,9.4345673685,8.1368709725,8.2230572347,8.0904960282,3.4151703921,3.0011201364,4.0213020324,4.1774157642,3.2193717806,2.5100645099,2.7872207677,1.3768353102,2.4070141044,1.8993252673,29.945034811,21.529162293,20.867297033,21.659704307,22.560852439,31.066595528,21.959567806,21.781083186,28.949518053,25.048007807,33.360205203,24.530282429,24.888599065,25.837120071,25.78022422,33.576660038,24.746788574,23.157918496,31.356532157,26.947333074 +050,2,4,19,051,Iowa,Davis County,8753,8753,8777,8772,8705,8767,8755,8774,8893,8969,8967,9006,9051,24,-5,-67,62,-12,19,119,76,-2,39,45,30,131,137,127,136,137,162,158,154,162,158,13,90,85,95,83,69,109,81,88,87,84,17,41,52,32,53,68,53,77,66,75,74,0,0,0,0,0,0,3,2,0,2,3,7,-46,-120,31,-64,-48,64,-2,-69,-38,-32,7,-46,-120,31,-64,-48,67,0,-69,-36,-29,0,0,1,-1,-1,-1,-1,-1,1,0,0,124,124,110,117,104,85,90,101,106,88,92,92,14.92962562,15.677747897,14.537545788,15.523342084,15.63123966,18.339276617,17.691187997,17.172167707,18.027040561,17.50013845,10.256994701,9.7270698632,10.874542125,9.4738043602,7.8726681499,12.339389823,9.069533087,9.8126672614,9.6811884493,9.3038710749,4.6726309191,5.950678034,3.663003663,6.049537724,7.7585715101,5.9998867946,8.6216549099,7.359500446,8.3458521115,8.1962673755,0,0,0,0,0,0.3396162337,0.2239390886,0,0.2225560563,0.3322811098,-5.242463958,-13.73233392,3.5485347985,-7.305102157,-5.476638713,7.245146318,-0.223939089,-7.694023194,-4.22856507,-3.544331838,-5.242463958,-13.73233392,3.5485347985,-7.305102157,-5.476638713,7.5847625516,0,-7.694023194,-4.006009014,-3.212050728 +050,2,4,19,053,Iowa,Decatur County,8457,8456,8419,8250,8241,8223,8216,8145,8061,7956,7901,7852,7769,-37,-169,-9,-18,-7,-71,-84,-105,-55,-49,-83,29,80,90,88,105,93,94,106,95,99,90,39,97,90,94,115,81,88,93,91,80,78,-10,-17,0,-6,-10,12,6,13,4,19,12,-1,11,9,8,9,12,11,9,7,8,6,-27,-162,-16,-20,-7,-94,-102,-128,-68,-76,-99,-28,-151,-7,-12,2,-82,-91,-119,-61,-68,-93,1,-1,-2,0,1,-1,1,1,2,0,-2,663,663,697,703,789,764,753,708,693,696,652,652,9.5986561881,10.91504457,10.689990282,12.774499665,11.368498258,11.600641738,13.235936817,11.982089929,12.56903447,11.522949875,11.638370628,10.91504457,11.418853256,13.991118681,9.901595257,10.860175244,11.612661547,11.477580879,10.156795531,9.9865565585,-2.03971444,0,-0.728862974,-1.216619016,1.466903001,0.7404664939,1.62327527,0.5045090496,2.4122389386,1.5363933167,1.3198152259,1.091504457,0.9718172983,1.0949571142,1.466903001,1.3575219055,1.1238059562,0.8828908369,1.0156795531,0.7681966583,-19.43727878,-1.940452368,-2.429543246,-0.851633311,-11.49074017,-12.5879304,-15.98301804,-8.576653844,-9.648955754,-12.67524486,-18.11746356,-0.848947911,-1.457725948,0.2433238032,-10.02383717,-11.23040849,-14.85921209,-7.693763007,-8.633276201,-11.9070482 +050,2,4,19,055,Iowa,Delaware County,17764,17770,17763,17631,17568,17475,17397,17395,17289,17139,17115,17057,16937,-7,-132,-63,-93,-78,-2,-106,-150,-24,-58,-120,47,187,199,195,212,230,213,183,210,194,189,53,158,170,171,171,185,171,175,163,173,190,-6,29,29,24,41,45,42,8,47,21,-1,0,1,3,15,15,9,5,7,4,7,6,1,-163,-97,-134,-136,-56,-152,-165,-75,-86,-124,1,-162,-94,-119,-121,-47,-147,-158,-71,-79,-118,-2,1,2,2,2,0,-1,0,0,0,-1,218,218,221,230,222,222,219,224,216,219,218,218,10.566762728,11.307139407,11.129184145,12.158752007,13.221430214,12.282320378,10.63088184,12.261341741,11.354325179,11.119609343,8.928066904,9.6593653229,9.7594384042,9.8072952512,10.63462865,9.8604543882,10.166143836,9.5171366848,10.125248742,11.178443255,1.6386958242,1.6477740845,1.3697457409,2.3514567561,2.5868015636,2.4218659901,0.464738004,2.7442050563,1.2290764368,-0.058833912,0.0565067526,0.1704593881,0.8560910881,0.8602890571,0.5173603127,0.2883173798,0.4066457535,0.2335493665,0.4096921456,0.3530034712,-9.210600667,-5.511520214,-7.647747054,-7.799954118,-3.219130835,-8.764848345,-9.585221331,-4.379050622,-5.033360646,-7.295405071,-9.154093914,-5.341060826,-6.791655966,-6.939665061,-2.701770522,-8.476530965,-9.178575578,-4.145501255,-4.623668501,-6.9424016 +050,2,4,19,057,Iowa,Des Moines County,40325,40325,40243,40074,40247,40421,40127,39909,39719,39400,39259,39051,38708,-82,-169,173,174,-294,-218,-190,-319,-141,-208,-343,119,476,456,484,465,444,516,385,480,429,445,156,451,449,475,462,451,456,470,444,487,475,-37,25,7,9,3,-7,60,-85,36,-58,-30,6,15,15,36,32,28,44,51,40,27,22,-50,-207,158,134,-333,-238,-294,-284,-215,-177,-332,-44,-192,173,170,-301,-210,-250,-233,-175,-150,-310,-1,-2,-7,-5,4,-1,0,-1,-2,0,-3,685,685,677,710,745,631,631,652,633,628,630,630,11.853032359,11.354440308,11.999801656,11.545910513,11.095007247,12.960265233,9.7321755836,12.20457926,10.956455114,11.445620443,11.230499147,11.180139689,11.776664849,11.471420768,11.269928532,11.453257648,11.880837725,11.289235815,12.437747414,12.217235304,0.6225332121,0.1743006188,0.2231368077,0.0744897452,-0.174921285,1.5070075853,-2.148662142,0.9153434445,-1.4812923,-0.771614861,0.3735199273,0.3735013259,0.8925472306,0.7945572826,0.6996851417,1.1051388959,1.2891972851,1.0170482717,0.6895671051,0.5658508983,-5.154574997,3.9342139665,3.3222591362,-8.268361722,-5.947323704,-7.384337168,-7.179059392,-5.46663446,-4.520495467,-8.539204465,-4.781055069,4.3077152924,4.2148063668,-7.47380444,-5.247638563,-6.279198272,-5.889862106,-4.449586188,-3.830928362,-7.973353567 +050,2,4,19,059,Iowa,Dickinson County,16667,16667,16669,16861,16929,16883,16845,17009,17135,17167,17159,17290,17549,2,192,68,-46,-38,164,126,32,-8,131,259,44,141,181,154,174,173,172,130,153,157,152,51,199,186,222,228,183,191,215,198,194,186,-7,-58,-5,-68,-54,-10,-19,-85,-45,-37,-34,0,4,7,8,11,6,24,21,11,19,17,12,245,68,15,8,168,122,98,28,150,278,12,249,75,23,19,174,146,119,39,169,295,-3,1,-2,-1,-3,0,-1,-2,-2,-1,-2,211,211,219,212,210,202,203,186,186,192,182,180,8.4103787653,10.713228766,9.1091920028,10.317836812,10.220358008,10.07497657,7.5797329602,8.9145254326,9.1149235101,8.7258532105,11.869967194,11.009174312,13.131432627,13.519924099,10.811130147,11.187910028,12.535712203,11.536444678,11.263026503,10.677688797,-3.459588428,-0.295945546,-4.022240625,-3.202087287,-0.590772139,-1.112933458,-4.955979243,-2.621919245,-2.148102993,-1.951835587,0.2385923054,0.4143237644,0.4732047794,0.6522770398,0.3544632835,1.4058106842,1.2244184013,0.6409135932,1.1030799152,0.9759177933,14.613778706,4.0248594259,0.8872589613,0.4743833017,9.9249719383,7.1462043112,5.7139525392,1.631416419,8.7085256466,15.959126267,14.852371011,4.4391831903,1.3604637407,1.1266603416,10.279435222,8.5520149953,6.9383709405,2.2723300122,9.8116055618,16.93504406 +050,2,4,19,061,Iowa,Dubuque County,93653,93643,93933,94656,95183,95990,96544,96934,96819,97162,96961,97432,97590,290,723,527,807,554,390,-115,343,-201,471,158,317,1159,1163,1167,1283,1237,1198,1165,1168,1207,1196,163,868,865,916,940,952,864,905,954,891,970,154,291,298,251,343,285,334,260,214,316,226,22,115,65,127,105,96,127,137,70,150,128,120,320,180,433,127,21,-573,-49,-486,6,-198,142,435,245,560,232,117,-446,88,-416,156,-70,-6,-3,-16,-4,-21,-12,-3,-5,1,-1,2,4268,4268,4272,4185,4255,4348,4305,4221,4259,4246,4138,4139,12.291278919,12.252487634,12.208837022,13.327516179,12.786983533,12.366260135,12.011485661,12.033607558,12.418142629,12.265282891,9.2052028485,9.1129852138,9.582943198,9.7645091257,9.8409121451,8.9185715834,9.3308107495,9.8288198719,9.166996754,9.9475956559,3.0860760702,3.1395024205,2.6258938239,3.5630070533,2.946071388,3.4476885519,2.6806749115,2.2047876862,3.2511458746,2.3176872353,1.2195833267,0.6847907964,1.3286395045,1.0907164449,0.9923608886,1.3109474434,1.4125094726,0.7211922338,1.5432654468,1.3126724164,3.39362317,1.8963437439,4.5299283895,1.3192475095,0.2170789444,-5.914747126,-0.505204118,-5.007134652,0.0617306179,-2.030540144,4.6132064967,2.5811345403,5.858567894,2.4099639544,1.209439833,-4.603799683,0.9073053546,-4.285942418,1.6049960647,-0.717867728 +050,2,4,19,063,Iowa,Emmet County,10302,10302,10277,10092,9949,9886,9830,9708,9588,9428,9276,9224,9095,-25,-185,-143,-63,-56,-122,-120,-160,-152,-52,-129,30,101,115,112,113,109,109,107,116,101,106,49,114,130,146,113,114,115,131,133,114,113,-19,-13,-15,-34,0,-5,-6,-24,-17,-13,-7,18,63,4,11,4,8,10,12,9,11,7,-25,-237,-136,-38,-61,-125,-126,-148,-144,-50,-129,-7,-174,-132,-27,-57,-117,-116,-136,-135,-39,-122,1,2,4,-2,1,0,2,0,0,0,0,540,540,516,430,432,448,443,416,401,420,432,431,9.9170307821,11.47647323,11.293168641,11.462771353,11.157743884,11.297678275,11.253681111,12.403763901,10.918918919,11.572684098,11.193480289,12.973404521,14.721451979,11.462771353,11.669566998,11.919568823,13.777871266,14.221556886,12.324324324,12.336917954,-1.276449507,-1.496931291,-3.428283338,0,-0.511823114,-0.621890547,-2.524190156,-1.817792985,-1.405405405,-0.764233856,6.1858706858,0.3991816776,1.1091504916,0.4057618178,0.8189169823,1.0364842454,1.2620950778,0.9623609923,1.1891891892,0.7642338556,-23.27065639,-13.57217704,-3.831610789,-6.187867722,-12.79557785,-13.05970149,-15.56583929,-15.39777588,-5.405405405,-14.0837382,-17.0847857,-13.17299536,-2.722460297,-5.782105904,-11.97666087,-12.02321725,-14.30374422,-14.43541488,-4.216216216,-13.31950434 +050,2,4,19,065,Iowa,Fayette County,20880,20882,20860,20975,20773,20516,20288,20143,19858,19680,19643,19575,19258,-22,115,-202,-257,-228,-145,-285,-178,-37,-68,-317,50,217,220,220,195,210,220,211,207,219,202,42,237,246,275,265,266,263,254,269,213,233,8,-20,-26,-55,-70,-56,-43,-43,-62,6,-31,2,28,18,25,31,23,20,17,9,20,14,-32,108,-196,-230,-192,-111,-263,-151,18,-94,-298,-30,136,-178,-205,-161,-88,-243,-134,27,-74,-284,0,-1,2,3,3,-1,1,-1,-2,0,-2,782,782,830,887,916,914,890,773,823,888,831,832,10.374088682,10.539427038,10.656591344,9.5578864817,10.388068561,10.999725007,10.673276342,10.528189609,11.168341068,10.403522777,11.330225887,11.784995688,13.32073918,12.988922655,13.158220178,13.149671258,12.848399009,13.68156041,10.862359121,12.000103005,-0.956137206,-1.24556865,-2.664147836,-3.431036173,-2.770151616,-2.149946251,-2.175122667,-3.153370801,0.3059819471,-1.596580228,1.338592088,0.8623167577,1.2109762891,1.5194588766,1.1377408424,0.9999750006,0.8599322171,0.4577473743,1.0199398236,0.7210362321,5.1631409107,-9.389671362,-11.14098186,-9.410842074,-5.49083624,-13.14967126,-7.638221458,0.9154947486,-4.793717171,-15.34777123,6.5017329987,-8.527354604,-9.93000557,-7.891383198,-4.353095397,-12.14969626,-6.778289241,1.3732421229,-3.773777347,-14.62673499 +050,2,4,19,067,Iowa,Floyd County,16303,16293,16308,16095,16090,16029,16008,15920,15870,15778,15784,15655,15480,15,-213,-5,-61,-21,-88,-50,-92,6,-129,-175,32,194,200,168,210,197,197,204,190,164,171,29,185,199,209,209,200,176,189,192,145,176,3,9,1,-41,1,-3,21,15,-2,19,-5,3,-1,-4,-5,-1,20,24,19,34,2,12,11,-222,0,-13,-19,-105,-95,-126,-25,-150,-181,14,-223,-4,-18,-20,-85,-71,-107,9,-148,-169,-2,1,-2,-2,-2,0,0,0,-1,0,-1,304,304,300,304,304,294,303,275,249,260,227,228,11.97419992,12.428149759,10.461097793,13.109841745,12.340265598,12.393834539,12.891809909,12.03979469,10.43290181,10.984422675,11.4186958,12.36600901,13.014103801,13.047413928,12.528188424,11.07266436,11.94388271,12.166529371,9.224211966,11.305604625,0.55550412,0.0621407488,-2.553006009,0.0624278178,-0.187922826,1.3211701793,0.9479271992,-0.126734681,1.2086898438,-0.32118195,-0.06172268,-0.248562995,-0.311342196,-0.062427818,1.2528188424,1.5099087763,1.2007077856,2.1544895761,0.1272305099,0.770836679,-13.70243496,0,-0.80948971,-1.186128539,-6.577298923,-5.97672224,-7.962588473,-1.584183512,-9.542288241,-11.62678657,-13.76415764,-0.248562995,-1.120831906,-1.248556357,-5.32448008,-4.466813463,-6.761880688,0.5703060643,-9.415057731,-10.8559499 +050,2,4,19,069,Iowa,Franklin County,10680,10680,10706,10695,10509,10507,10433,10318,10173,10150,10081,10082,9971,26,-11,-186,-2,-74,-115,-145,-23,-69,1,-111,41,125,106,112,132,123,124,134,117,108,108,16,121,119,138,110,108,135,119,146,102,114,25,4,-13,-26,22,15,-11,15,-29,6,-6,5,0,-3,4,11,6,6,4,1,5,6,-3,-15,-174,20,-109,-137,-142,-41,-40,-10,-111,2,-15,-177,24,-98,-131,-136,-37,-39,-5,-105,-1,0,4,0,2,1,2,-1,-1,0,0,198,198,191,192,193,190,192,178,193,185,185,185,11.681697117,9.9981135635,10.65854587,12.607449857,11.854850369,12.102874433,13.187029474,11.566407988,10.712691564,10.771455643,11.307882809,11.224297302,13.132851161,10.506208214,10.409136909,13.176516519,11.710869458,14.433295438,10.117542032,11.369869845,0.3738143077,-1.226183739,-2.474305291,2.1012416428,1.4457134596,-1.073642087,1.4761600157,-2.86688745,0.5951495313,-0.598414202,0,-0.282965478,0.3806623525,1.0506208214,0.5782853838,0.5856229564,0.3936426709,0.0988581879,0.4959579428,0.5984142024,-1.401803654,-16.41199774,1.9033117625,-10.41069723,-13.20418293,-13.8597433,-4.034837376,-3.954327517,-0.991915886,-11.07066274,-1.401803654,-16.69496321,2.283974115,-9.360076409,-12.62589755,-13.27412035,-3.641194706,-3.855469329,-0.495957943,-10.47224854 +050,2,4,19,071,Iowa,Fremont County,7441,7438,7434,7371,7140,7068,7029,6910,6945,6927,6956,6917,6729,-4,-63,-231,-72,-39,-119,35,-18,29,-39,-188,22,83,65,70,79,80,84,78,82,69,64,13,89,95,101,92,104,96,88,82,81,96,9,-6,-30,-31,-13,-24,-12,-10,0,-12,-32,0,3,1,2,2,3,2,2,0,2,2,-12,-59,-210,-43,-28,-99,46,-10,29,-29,-157,-12,-56,-209,-41,-26,-96,48,-8,29,-27,-155,-1,-1,8,0,0,1,-1,0,0,0,-1,135,135,131,132,132,139,134,123,131,131,131,131,11.212428234,8.9587209703,9.8536036036,11.208058452,11.478585264,12.125586431,11.24567474,11.813008716,9.9473798025,9.3800381064,12.022965214,13.093515264,14.217342342,13.052422501,14.922160844,13.857813064,12.687427912,11.813008716,11.677358899,14.07005716,-0.810536981,-4.134794294,-4.363738739,-1.844364049,-3.443575579,-1.732226633,-1.441753172,0,-1.729979096,-4.690019053,0.4052684904,0.1378264765,0.2815315315,0.2837483152,0.4304469474,0.2887044388,0.2883506344,0,0.2883298493,0.2931261908,-7.970280311,-28.94356006,-6.052927928,-3.972476413,-14.20474926,6.6402020931,-1.441753172,4.1777713751,-4.180782816,-23.01040598,-7.56501182,-28.80573358,-5.771396396,-3.688728098,-13.77430232,6.9289065319,-1.153402537,4.1777713751,-3.892452966,-22.71727979 +050,2,4,19,073,Iowa,Greene County,9336,9337,9362,9331,9181,9158,9127,8947,9011,8959,8971,8881,8795,25,-31,-150,-23,-31,-180,64,-52,12,-90,-86,39,93,88,108,103,105,116,107,102,89,90,20,112,130,123,125,116,123,139,118,104,110,19,-19,-42,-15,-22,-11,-7,-32,-16,-15,-20,3,1,4,4,0,1,-1,1,0,0,1,5,-13,-114,-11,-9,-171,71,-22,30,-74,-67,8,-12,-110,-7,-9,-170,70,-21,30,-74,-66,-2,0,2,-1,0,1,1,1,-2,-1,0,142,142,138,137,135,88,82,85,89,89,89,88,9.9502487562,9.507346586,11.778177654,11.266065081,11.618900077,12.9190333,11.908736784,11.377579476,9.970871611,10.183299389,11.983095276,14.04494382,13.414035662,13.672409078,12.836118181,13.698630137,15.470228158,13.162297825,11.65135559,12.446254809,-2.03284652,-4.537597234,-1.635858008,-2.406343998,-1.217218103,-0.779596837,-3.561491375,-1.784718349,-1.680483979,-2.26295542,0.1069919221,0.4321521175,0.436228802,0,0.1106561912,-0.111370977,0.1112966055,0,0,0.113147771,-1.390894987,-12.31633535,-1.199629206,-0.984413454,-18.9222087,7.9073393474,-2.44852532,3.3463469046,-8.290387632,-7.580900656,-1.283903065,-11.88418323,-0.763400404,-0.984413454,-18.81155251,7.7959683706,-2.337228715,3.3463469046,-8.290387632,-7.467752885 +050,2,4,19,075,Iowa,Grundy County,12453,12453,12464,12478,12437,12340,12388,12402,12303,12296,12268,12227,12217,11,14,-41,-97,48,14,-99,-7,-28,-41,-10,47,134,135,135,122,123,141,97,134,137,127,40,127,122,122,119,143,133,146,151,153,140,7,7,13,13,3,-20,8,-49,-17,-16,-13,0,1,1,1,0,0,0,0,0,0,0,5,6,-54,-114,48,36,-107,42,-10,-25,2,5,7,-53,-113,48,36,-107,42,-10,-25,2,-1,0,-1,3,-3,-2,0,0,-1,0,1,154,154,147,148,154,153,154,156,152,153,145,145,10.744928234,10.836845274,10.897203051,9.8673568424,9.923356192,11.414693382,7.8864994512,10.910275199,11.185956318,10.39109802,10.183626012,9.7932972105,9.8478427574,9.6247169201,11.536910044,10.767051204,11.870401236,12.29441459,12.492345377,11.454753723,0.5613022212,1.0435480634,1.0493602938,0.2426399224,-1.613553852,0.6476421777,-3.983901785,-1.384139391,-1.306389059,-1.063655703,0.0801860316,0.080272928,0.0807200226,0,0,0,0,0,0,0,0.4811161896,-4.33473811,-9.202082577,3.8822387577,2.9043969342,-8.662214127,3.4147729583,-0.814199642,-2.041232905,0.1636393389,0.5613022212,-4.254465182,-9.121362554,3.8822387577,2.9043969342,-8.662214127,3.4147729583,-0.814199642,-2.041232905,0.1636393389 +050,2,4,19,077,Iowa,Guthrie County,10954,10959,10942,10864,10768,10675,10690,10653,10661,10652,10719,10741,10737,-17,-78,-96,-93,15,-37,8,-9,67,22,-4,20,101,111,106,108,114,123,90,121,94,97,43,130,111,107,123,145,116,126,124,120,129,-23,-29,0,-1,-15,-31,7,-36,-3,-26,-32,1,3,1,4,7,5,8,8,3,8,6,5,-53,-99,-96,25,-10,-5,19,69,39,22,6,-50,-98,-92,32,-5,3,27,72,47,28,0,1,2,0,-2,-1,-2,0,-2,1,0,170,170,163,169,167,168,160,168,168,168,168,168,9.2635054572,10.262573964,9.8866763046,10.109992979,10.68265942,11.541709674,8.4455496645,11.323756492,8.7604846226,9.0324983704,11.923323856,10.262573964,9.9799468358,11.514158671,13.587593122,10.884864408,11.82376953,11.604510786,11.18359739,12.012291647,-2.659818399,0,-0.093270531,-1.404165692,-2.904933702,0.656845266,-3.378219866,-0.280754293,-2.423112768,-2.979793277,0.2751536274,0.0924556213,0.3730821247,0.6552773227,0.4685376939,0.750680304,0.7507155257,0.2807542932,0.7455731594,0.5587112394,-4.861047418,-9.153106509,-8.953970993,2.3402761526,-0.937075388,-0.46917519,1.7829493736,6.4573487436,3.6346691519,2.0486078778,-4.585893791,-9.060650888,-8.580888868,2.9955534753,-0.468537694,0.281505114,2.5336648994,6.7381030368,4.3802423113,2.6073191172 +050,2,4,19,079,Iowa,Hamilton County,15673,15675,15634,15468,15321,15347,15222,15220,15090,15034,14887,14797,14716,-41,-166,-147,26,-125,-2,-130,-56,-147,-90,-81,39,157,172,161,213,190,206,168,180,175,176,53,158,171,172,179,165,159,189,194,174,178,-14,-1,1,-11,34,25,47,-21,-14,1,-2,0,-2,8,21,20,9,7,5,2,9,8,-26,-165,-159,16,-181,-35,-185,-39,-134,-100,-87,-26,-167,-151,37,-161,-26,-178,-34,-132,-91,-79,-1,2,3,0,2,-1,1,-1,-1,0,0,198,198,194,185,192,191,200,203,199,196,198,198,10.095813774,11.172821462,10.499543498,13.93568648,12.48275409,13.592873639,11.153897225,12.031683433,11.790863765,11.926947447,10.16011832,11.107863198,11.216903613,11.711210704,10.840286446,10.491586935,12.548134378,12.967481033,11.723487401,12.062480941,-0.064304546,0.0649582643,-0.717360115,2.2244757761,1.6424676434,3.1012867041,-1.394237153,-0.9357976,0.0673763644,-0.135533494,-0.128609093,0.5196661145,1.3695056737,1.3085151624,0.5912883516,0.4618937644,0.3319612269,0.1336853715,0.6063872793,0.5421339749,-10.61025014,-10.32836403,1.0434328942,-11.84206222,-2.299454701,-12.20719235,-2.58929757,-8.956919889,-6.737636437,-5.895706977,-10.73885924,-9.808697912,2.4129385679,-10.53354706,-1.708166349,-11.74529858,-2.257336343,-8.823234518,-6.131249158,-5.353573002 +050,2,4,19,081,Iowa,Hancock County,11341,11340,11300,11296,11180,11134,11043,11029,10887,10762,10726,10664,10507,-40,-4,-116,-46,-91,-14,-142,-125,-36,-62,-157,30,101,103,118,103,119,115,120,123,108,110,47,107,130,142,128,115,115,125,118,116,119,-17,-6,-27,-24,-25,4,0,-5,5,-8,-9,0,2,2,4,6,4,5,3,4,8,7,-24,1,-92,-26,-72,-20,-148,-124,-45,-61,-154,-24,3,-90,-22,-66,-16,-143,-121,-41,-53,-147,1,-1,1,0,0,-2,1,1,0,-1,-1,185,185,186,184,183,184,184,183,177,181,184,184,8.9396353337,9.1653319096,10.576319799,9.2889029174,10.782892352,10.494615806,11.0859624,11.448250186,10.098176718,10.391573379,9.4707027793,11.567894643,12.727435691,11.543491004,10.420442189,10.494615806,11.5478775,10.982874162,10.846189808,11.241793019,-0.531067446,-2.402562734,-2.151115891,-2.254588087,0.3624501631,0,-0.4619151,0.4653760238,-0.74801309,-0.85021964,0.1770224819,0.1779676099,0.3585193152,0.5411011408,0.3624501631,0.4562876437,0.27714906,0.3723008191,0.7480130902,0.6612819423,0.0885112409,-8.186510055,-2.330375549,-6.49321369,-1.812250816,-13.50611425,-11.45549448,-4.188384214,-5.703599813,-14.54820273,0.2655337228,-8.008542445,-1.971856234,-5.952112549,-1.449800652,-13.04982661,-11.17834542,-3.816083395,-4.955586723,-13.88692079 +050,2,4,19,083,Iowa,Hardin County,17534,17534,17543,17376,17360,17390,17338,17257,17193,17076,16965,16809,16575,9,-167,-16,30,-52,-81,-64,-117,-111,-156,-234,54,185,166,200,189,185,187,173,186,149,160,38,227,207,240,212,224,230,211,210,213,234,16,-42,-41,-40,-23,-39,-43,-38,-24,-64,-74,1,14,6,30,14,10,14,16,11,31,22,-5,-139,22,43,-40,-51,-33,-94,-98,-123,-180,-4,-125,28,73,-26,-41,-19,-78,-87,-92,-158,-3,0,-3,-3,-3,-1,-2,-1,0,0,-2,870,870,840,871,841,863,786,796,842,813,768,769,10.595950629,9.557807462,11.510791367,10.884588804,10.695187166,10.856313498,10.096588754,10.92799859,8.8233552437,9.5854301462,13.001517798,11.918470751,13.81294964,12.209168394,12.949848244,13.352685051,12.314336572,12.338062924,12.613252798,14.018691589,-2.40556717,-2.360663289,-2.302158273,-1.32457959,-2.254661078,-2.496371553,-2.217747819,-1.410064334,-3.789897554,-4.433261443,0.8018557232,0.3454629203,1.726618705,0.8062658374,0.5781182252,0.8127721335,0.9337885553,0.6462794865,1.8357316279,1.3179966451,-7.961281824,1.2666973745,2.4748201439,-2.303616678,-2.948402948,-1.915820029,-5.486007762,-5.757762698,-7.283709362,-10.78360891,-7.1594261,1.6121602948,4.2014388489,-1.497350841,-2.370284723,-1.103047896,-4.552219207,-5.111483211,-5.447977734,-9.465612269 +050,2,4,19,085,Iowa,Harrison County,14928,14937,14908,14764,14474,14359,14268,14145,14051,14116,14086,14034,13928,-29,-144,-290,-115,-91,-123,-94,65,-30,-52,-106,43,142,146,149,181,152,162,163,161,160,157,61,200,176,189,160,189,187,167,182,184,190,-18,-58,-30,-40,21,-37,-25,-4,-21,-24,-33,0,0,0,0,0,0,0,1,2,0,0,-10,-87,-267,-77,-113,-86,-69,69,-11,-28,-72,-10,-87,-267,-77,-113,-86,-69,70,-9,-28,-72,-1,1,7,2,1,0,0,-1,0,0,-1,283,283,283,275,271,277,279,283,276,278,281,281,9.5713130224,9.987003215,10.3353796,12.645404688,10.699327772,11.49099163,11.573827529,11.417629955,11.379800853,11.229525785,13.480722567,12.039127163,13.10997815,11.178258288,13.303769401,13.264292807,11.857847836,12.906886036,13.086770982,13.589871969,-3.909409544,-2.052123948,-2.77459855,1.4671464003,-2.604441629,-1.773301177,-0.284020307,-1.489256081,-1.706970128,-2.360346184,0,0,0,0,0,0,0.0710050769,0.1418339125,0,0,-5.864114317,-18.26390314,-5.341102209,-7.894644916,-6.053567029,-4.89431125,4.8993503035,-0.780086519,-1.991465149,-5.14984622,-5.864114317,-18.26390314,-5.341102209,-7.894644916,-6.053567029,-4.89431125,4.9703553804,-0.638252606,-1.991465149,-5.14984622 +050,2,4,19,087,Iowa,Henry County,20145,20150,20112,20252,20003,20029,19846,19862,19842,20056,20015,19835,19697,-38,140,-249,26,-183,16,-20,214,-41,-180,-138,56,227,229,227,236,238,226,224,231,209,202,71,231,216,201,227,212,216,222,218,198,211,-15,-4,13,26,9,26,10,2,13,11,-9,11,15,4,6,26,21,27,18,9,15,13,-35,129,-273,-6,-223,-29,-55,193,-63,-206,-142,-24,144,-269,0,-197,-8,-28,211,-54,-191,-129,1,0,7,0,5,-2,-2,1,0,0,0,1554,1554,1596,1498,1490,1325,1371,1496,1669,1649,1576,1576,11.247646418,11.377468637,11.340927258,11.836990596,11.987508814,11.384243401,11.228633014,11.529535075,10.489335006,10.219568957,11.44584283,10.731586138,10.041966427,11.385579937,10.677949028,10.880515817,11.128377362,10.880686781,9.9372647428,10.674896287,-0.198196413,0.6458824991,1.2989608313,0.4514106583,1.3095597864,0.5037275841,0.1002556519,0.6488482943,0.5520702635,-0.45532733,0.7432365474,0.1987330766,0.2997601918,1.3040752351,1.057721366,1.3600644771,0.9023008672,0.4492026653,0.7528230866,0.6576950319,6.3918343078,-13.56353248,-0.299760192,-11.18495298,-1.460662839,-2.770501713,9.6746704095,-3.144418657,-10.33877039,-7.184053425,7.1350708552,-13.3647994,0,-9.880877743,-0.402941473,-1.410437236,10.576971277,-2.695215992,-9.585947302,-6.526358393 +050,2,4,19,089,Iowa,Howard County,9566,9564,9569,9548,9550,9443,9357,9322,9261,9235,9185,9146,9176,5,-21,2,-107,-86,-35,-61,-26,-50,-39,30,29,114,117,121,111,127,112,123,119,112,119,13,118,105,114,105,104,113,103,120,133,124,16,-4,12,7,6,23,-1,20,-1,-21,-5,2,11,2,3,-1,0,-3,-2,-2,-1,-1,-13,-28,-11,-118,-92,-57,-57,-44,-47,-15,36,-11,-17,-9,-115,-93,-57,-60,-46,-49,-16,35,0,0,-1,1,1,-1,0,0,0,-2,0,213,213,215,215,201,209,201,198,206,191,190,190,11.926557514,12.252591894,12.741536355,11.808510638,13.59815836,12.054027875,13.30017301,12.920738328,12.219737057,12.98984827,12.345033217,10.995915803,12.004422682,11.170212766,11.135499759,12.161653124,11.137543253,13.029315961,14.510937756,13.535640214,-0.418475702,1.2566760917,0.7371136735,0.6382978723,2.4626586006,-0.107625249,2.1626297578,-0.108577633,-2.291200698,-0.545791944,1.1508081812,0.2094460153,0.3159058601,-0.106382979,0,-0.322875747,-0.216262976,-0.217155266,-0.109104795,-0.109158389,-2.929329916,-1.151953084,-12.4256305,-9.787234043,-6.103110445,-6.134639186,-4.757785467,-5.103148751,-1.636571927,3.9297019976,-1.778521735,-0.942507069,-12.10972464,-9.893617021,-6.103110445,-6.457514933,-4.974048443,-5.320304017,-1.745676722,3.8205436088 +050,2,4,19,091,Iowa,Humboldt County,9815,9814,9791,9782,9724,9682,9641,9562,9530,9568,9520,9499,9473,-23,-9,-58,-42,-41,-79,-32,38,-48,-21,-26,25,107,109,109,102,112,107,113,107,109,105,31,119,125,115,116,125,124,118,115,95,124,-6,-12,-16,-6,-14,-13,-17,-5,-8,14,-19,1,2,2,9,6,9,8,2,5,15,12,-19,2,-44,-45,-31,-75,-21,41,-46,-50,-17,-18,4,-42,-36,-25,-66,-13,43,-41,-35,-5,1,-1,0,0,-2,0,-2,0,1,0,-2,133,133,136,134,128,125,118,114,125,124,104,104,10.933428703,11.176048395,11.233639081,10.557366868,11.664844035,11.208883302,11.833699864,11.211232188,11.462221989,11.068943707,12.159607623,12.816569261,11.852004535,12.006417223,13.018799146,12.98973392,12.357314902,12.049455155,9.99000999,13.071895425,-1.22617892,-1.640520865,-0.618365454,-1.449050354,-1.353955111,-1.780850618,-0.523615038,-0.838222967,1.4722119985,-2.002951718,0.2043631533,0.2050651082,0.927548181,0.6210215805,0.9373535385,0.8380473497,0.2094460153,0.5238893546,1.5773699984,1.2650221379,0.2043631533,-4.51143238,-4.637740905,-3.208611499,-7.811279488,-2.199874293,4.2936433134,-4.819782062,-5.257899995,-1.792114695,0.4087263066,-4.306367272,-3.710192724,-2.587589919,-6.873925949,-1.361826943,4.5030893287,-4.295892707,-3.680529996,-0.527092557 +050,2,4,19,093,Iowa,Ida County,7089,7089,7067,7046,7045,7075,6971,6967,6960,6864,6829,6822,6833,-22,-21,-1,30,-104,-4,-7,-96,-35,-7,11,24,71,74,91,83,72,83,78,69,64,68,38,106,88,95,85,76,92,101,113,108,108,-14,-35,-14,-4,-2,-4,-9,-23,-44,-44,-40,0,0,0,2,2,8,1,0,0,0,0,-8,13,15,33,-106,-8,1,-72,9,39,50,-8,13,15,35,-104,0,2,-72,9,39,50,0,1,-2,-1,2,0,0,-1,0,-2,1,122,122,114,116,118,123,127,120,118,117,107,107,10.061645292,10.503158044,12.889518414,11.818311263,10.331467929,11.919293459,11.284722222,10.078142116,9.3766024467,9.9597217137,15.02161128,12.490241998,13.456090652,12.103089848,10.90543837,13.211746966,14.612268519,16.504783466,15.823016629,15.818381545,-4.959965989,-1.987083954,-0.566572238,-0.284778585,-0.573970441,-1.292453508,-3.327546296,-6.42664135,-6.446414182,-5.858659832,0,0,0.283286119,0.2847785847,1.147940881,0.1436059453,0,0,0,0,1.8422730816,2.1290185225,4.6742209632,-15.09326499,-1.147940881,0.1436059453,-10.41666667,1.3145402761,5.713867116,7.3233247895,1.8422730816,2.1290185225,4.9575070822,-14.8084864,0,0.2872118906,-10.41666667,1.3145402761,5.713867116,7.3233247895 +050,2,4,19,095,Iowa,Iowa County,16355,16356,16335,16324,16183,16286,16325,16293,16202,16139,16150,16146,16138,-21,-11,-141,103,39,-32,-91,-63,11,-4,-8,56,170,189,202,194,189,185,184,169,170,165,48,153,166,207,180,167,191,169,184,201,214,8,17,23,-5,14,22,-6,15,-15,-31,-49,0,-3,-2,-2,0,-2,-3,-4,-4,-4,-2,-29,-24,-167,113,28,-52,-81,-74,32,31,43,-29,-27,-169,111,28,-54,-84,-78,28,27,41,0,-1,5,-3,-3,0,-1,0,-2,0,0,290,290,286,286,288,289,284,284,284,288,283,283,10.410606571,11.628264681,12.442637593,11.897825887,11.588693359,11.386367133,11.378745246,10.467961225,10.527619519,10.221781688,9.3695459138,10.213184852,12.750623672,11.039219895,10.239744926,11.755654716,10.451130144,11.39707021,12.447361902,13.257341098,1.0410606571,1.415079829,-0.307986079,0.8586059918,1.3489484334,-0.369287583,0.9276151016,-0.929108984,-1.919742383,-3.03555941,-0.183716587,-0.12305042,-0.123194432,0,-0.122631676,-0.184643791,-0.247364027,-0.247762396,-0.247708695,-0.123900384,-1.469732692,-10.27471006,6.9604853861,1.7172119837,-3.18842357,-4.985382367,-4.576234501,1.9820991669,1.919742383,2.663858258,-1.653449279,-10.39776048,6.8372909544,1.7172119837,-3.311055246,-5.170026158,-4.823598528,1.734336771,1.6720336884,2.5399578739 +050,2,4,19,097,Iowa,Jackson County,19848,19855,19831,19734,19684,19516,19430,19363,19406,19377,19375,19375,19205,-24,-97,-50,-168,-86,-67,43,-29,-2,0,-170,40,209,195,204,214,204,240,228,197,221,211,62,242,230,230,218,240,199,214,235,222,242,-22,-33,-35,-26,-4,-36,41,14,-38,-1,-31,1,1,1,0,3,1,1,1,1,1,1,0,-65,-14,-143,-85,-30,2,-42,36,0,-140,1,-64,-13,-143,-82,-29,3,-41,37,1,-139,-3,0,-2,1,0,-2,-1,-2,-1,0,0,201,201,196,195,202,199,195,200,201,198,191,192,10.564893214,9.8939570754,10.408163265,10.989575309,10.51736138,12.381026078,11.757728902,10.167217176,11.406451613,10.938310005,12.233034247,11.669795525,11.734693878,11.194987932,12.373366329,10.265934123,11.035763092,12.128406276,11.458064516,12.54536029,-1.668141034,-1.775838449,-1.326530612,-0.205412623,-1.856004949,2.1150919549,0.7219658098,-1.9611891,-0.051612903,-1.607050285,0.0505497283,0.0507382414,0,0.154059467,0.051555693,0.0515876087,0.0515689864,0.0516102395,0.0516129032,0.0518403318,-3.285732339,-0.71033538,-7.295918367,-4.36501823,-1.546670791,0.1031752173,-2.165897429,1.857968621,0,-7.257646449,-3.235182611,-0.659597138,-7.295918367,-4.210958763,-1.495115098,0.154762826,-2.114328443,1.9095788604,0.0516129032,-7.205806117 +050,2,4,19,099,Iowa,Jasper County,36842,36842,36810,36624,36583,36739,36891,36762,36722,36997,37121,37171,37148,-32,-186,-41,156,152,-129,-40,275,124,50,-23,114,371,454,434,414,418,400,406,388,420,400,123,334,376,354,388,383,345,424,404,385,401,-9,37,78,80,26,35,55,-18,-16,35,-1,3,15,8,10,-1,9,6,6,3,11,9,-24,-237,-128,72,133,-171,-99,289,138,5,-34,-21,-222,-120,82,132,-162,-93,295,141,16,-25,-2,-1,1,-6,-6,-2,-2,-2,-1,-1,3,1648,1648,1713,1705,1808,1827,1785,1719,1748,1765,1809,1809,10.104311354,12.403185488,11.838193175,11.245416271,11.350522043,10.886723641,11.014799441,10.469791414,11.306735584,10.764407487,9.096603753,10.272241726,9.6560377513,10.539182398,10.400119479,9.3897991399,11.503140303,10.90153539,10.364507619,10.791318505,1.0077076014,2.1309437622,2.182155424,0.7062338721,0.9504025634,1.4969245006,-0.488340862,-0.431743976,0.9422279653,-0.026911019,0.4085301087,0.2185583346,0.272769428,-0.027162841,0.2443892306,0.1633008546,0.1627802873,0.0809519955,0.2961287891,0.2421991684,-6.454775717,-3.496933353,1.9639398816,3.612657884,-4.643395381,-2.694464101,7.8405838386,3.7237917915,0.134603995,-0.914974636,-6.046245608,-3.278375019,2.2367093096,3.5854950428,-4.39900615,-2.531163246,8.0033641259,3.8047437869,0.4307327841,-0.672775468 +050,2,4,19,101,Iowa,Jefferson County,16843,16836,16835,17099,17281,17632,17795,17913,18027,18108,18102,18180,18347,-1,264,182,351,163,118,114,81,-6,78,167,37,129,147,146,150,172,168,148,152,144,141,48,163,142,159,169,127,161,203,171,169,191,-11,-34,5,-13,-19,45,7,-55,-19,-25,-50,39,236,235,364,307,222,191,210,104,202,158,-32,63,-58,4,-126,-151,-84,-73,-94,-98,60,7,299,177,368,181,71,107,137,10,104,218,3,-1,0,-4,1,2,0,-1,3,-1,-1,1731,1731,1731,1728,1725,1724,1729,1720,1715,1712,1708,1704,7.6029940473,8.5514834206,8.3636467791,8.4681175375,9.6336955304,9.3489148581,8.1915040819,8.3954708644,7.9378204068,7.7203164782,9.6068839512,8.2606166376,9.108355054,9.5407457589,7.1132519323,8.959376739,11.235644112,9.4449047225,9.3159142274,10.458017357,-2.003889904,0.290866783,-0.744708275,-1.072628221,2.5204435981,0.3895381191,-3.04414003,-1.049433858,-1.378093821,-2.737700879,13.909353451,13.670738802,20.851831696,17.331413893,12.434188417,10.628825821,11.623080116,5.7442695388,11.134998071,8.651134777,3.7130901161,-3.374054683,0.2291410076,-7.113218731,-8.457488518,-4.674457429,-4.04040404,-5.191935929,-5.402127777,3.2852410546,17.622443567,10.296684119,21.080972704,10.218195162,3.9766998992,5.9543683918,7.5826760758,0.5523336095,5.7328702938,11.936375832 +050,2,4,19,103,Iowa,Johnson County,130882,130882,131344,134125,137180,140266,142874,145114,147167,149703,151003,152480,153740,462,2781,3055,3086,2608,2240,2053,2536,1300,1477,1260,453,1761,1793,1809,1800,1847,1821,1778,1753,1742,1719,166,576,632,683,683,687,744,739,730,742,835,287,1185,1161,1126,1117,1160,1077,1039,1023,1000,884,210,1135,713,1071,1119,852,966,1161,570,1103,868,-23,456,1153,882,391,233,12,338,-291,-632,-501,187,1591,1866,1953,1510,1085,978,1499,279,471,367,-12,5,28,7,-19,-5,-2,-2,-2,6,9,7857,7858,7921,8035,7986,8009,8521,8629,8508,8180,8386,8388,13.267085799,13.217596432,13.040375424,12.714558169,12.826923344,12.460611535,11.978307003,11.659228615,11.480049953,11.227222259,4.3394897333,4.6589631595,4.9234806052,4.8244684608,4.7710321263,5.0909912037,4.9786101661,4.855240667,4.8898949859,5.4535954542,8.9275960658,8.5586332725,8.1168948192,7.8900897083,8.0558912177,7.3696203311,6.999696837,6.8039879484,6.5901549675,5.7736268043,8.5509042487,5.2560771088,7.7204212712,7.9042169951,5.9169132047,6.6100772886,7.8216054165,3.791078329,7.2689409291,5.6691267716,3.4354293722,8.4996590553,6.357993988,2.7618845801,1.6181229773,0.0821127613,2.2770909826,-1.935445252,-4.164977939,-3.272157273,11.986333621,13.755736164,14.078415259,10.666101575,7.5350361821,6.69219005,10.098696399,1.8556330768,3.1039629897,2.3969694991 +050,2,4,19,105,Iowa,Jones County,20638,20634,20687,20743,20602,20522,20553,20435,20385,20610,20627,20634,20617,53,56,-141,-80,31,-118,-50,225,17,7,-17,58,209,200,204,223,211,202,210,201,198,198,30,189,218,194,231,198,212,180,204,193,230,28,20,-18,10,-8,13,-10,30,-3,5,-32,0,11,5,17,39,18,12,11,7,14,12,27,26,-130,-107,4,-149,-52,184,14,-11,3,27,37,-125,-90,43,-131,-40,195,21,3,15,-2,-1,2,0,-4,0,0,0,-1,-1,0,1304,1304,1389,1304,1187,1250,1200,1097,1167,1184,1197,1196,10.089307265,9.674688596,9.9212138897,10.858186245,10.295696301,9.8971092602,10.245151848,9.7485268084,9.5974406825,9.5997672784,9.1238233164,10.54541057,9.4348798755,11.24771759,9.6613643017,10.387065164,8.7815587267,9.8940272086,9.3550810693,11.151244818,0.9654839488,-0.870721974,0.4863340142,-0.389531345,0.6343319996,-0.489955904,1.4635931211,-0.1455004,0.2423596132,-1.55147754,0.5310161719,0.2418672149,0.8267678241,1.8989653074,0.8783058456,0.5879470848,0.5366508111,0.3395009336,0.6786069169,0.5818040775,1.2551291335,-6.288547587,-5.203773952,0.1947656726,-7.270420611,-2.547770701,8.9767044762,0.6790018673,-0.533191149,0.1454510194,1.7861453053,-6.046680372,-4.377006128,2.0937309799,-6.392114765,-1.959823616,9.5133552872,1.0185028009,0.1454157679,0.7272550968 +050,2,4,19,107,Iowa,Keokuk County,10511,10510,10508,10399,10427,10336,10282,10169,10171,10144,10221,10192,10085,-2,-109,28,-91,-54,-113,2,-27,77,-29,-107,29,127,135,117,131,106,120,115,138,97,105,12,101,97,144,116,122,110,122,130,114,114,17,26,38,-27,15,-16,10,-7,8,-17,-9,0,1,1,4,5,6,7,10,6,10,7,-18,-137,-11,-68,-76,-104,-15,-29,63,-20,-105,-18,-136,-10,-64,-71,-98,-8,-19,69,-10,-98,-1,1,0,0,2,1,0,-1,0,-2,0,140,140,145,150,142,139,130,126,141,139,136,136,12.149040991,12.964563526,11.270047681,12.707343098,10.36624126,11.799410029,11.321683485,13.552663884,9.5037476118,10.356561622,9.6618357488,9.3152789782,13.870827915,11.252303812,11.930956921,10.81612586,12.010829436,12.76700221,11.169352863,11.244266903,2.4872052423,3.6492845482,-2.600780234,1.4550392861,-1.564715662,0.9832841691,-0.689145951,0.7856616744,-1.665605252,-0.887705282,0.0956617401,0.0960338039,0.3853007754,0.4850130954,0.5867683732,0.6882989184,0.9844942161,0.5892462558,0.979767795,0.6904374414,-13.10565839,-1.056371843,-6.550113182,-7.372199049,-10.1706518,-1.474926254,-2.855033227,6.1870856862,-1.95953559,-10.35656162,-13.00999665,-0.960338039,-6.164812407,-6.887185954,-9.583883429,-0.786627335,-1.870539011,6.7763319421,-0.979767795,-9.66612418 +050,2,4,19,109,Iowa,Kossuth County,15543,15545,15524,15396,15407,15325,15221,15150,15104,14935,14834,14769,14680,-21,-128,11,-82,-104,-71,-46,-169,-101,-65,-89,53,160,164,150,146,178,175,160,171,172,173,53,185,174,204,182,211,180,175,181,156,178,0,-25,-10,-54,-36,-33,-5,-15,-10,16,-5,0,8,2,8,8,8,12,10,3,12,5,-22,-111,24,-35,-74,-46,-52,-163,-95,-93,-89,-22,-103,26,-27,-66,-38,-40,-153,-92,-81,-84,1,0,-5,-1,-2,0,-1,-1,1,0,0,257,257,254,258,244,248,240,238,238,238,219,219,10.349288486,10.648313476,9.7618117923,9.5593531068,11.721708208,11.568718186,10.652818003,11.488461151,11.620443874,11.749125607,11.966364812,11.297600883,13.276064037,11.916453873,13.894833888,11.899252991,11.651519691,12.160300984,10.539472351,12.088695711,-1.617076326,-0.649287407,-3.514252245,-2.357100766,-2.173125679,-0.330534805,-0.998701688,-0.671839833,1.0809715232,-0.339570104,0.5174644243,0.1298574814,0.5206299623,0.5238001702,0.5268183464,0.7932835328,0.6658011252,0.20155195,0.8107286424,0.3395701042,-7.179818887,1.558289777,-2.277756085,-4.845151575,-3.029205492,-3.437561975,-10.85255834,-6.382478417,-6.283146978,-6.044347856,-6.662354463,1.6881472584,-1.757126123,-4.321351404,-2.502387146,-2.644278443,-10.18675722,-6.180926467,-5.472418336,-5.704777751 +050,2,4,19,111,Iowa,Lee County,35862,35862,35850,35575,35549,35250,35077,34916,34441,34239,33929,33641,33480,-12,-275,-26,-299,-173,-161,-475,-202,-310,-288,-161,88,390,413,428,428,429,381,437,387,338,328,77,429,435,446,453,436,437,443,421,421,462,11,-39,-22,-18,-25,-7,-56,-6,-34,-83,-134,5,23,13,9,4,1,-3,-3,-4,-3,2,-22,-260,-10,-297,-150,-155,-415,-194,-272,-203,-29,-17,-237,3,-288,-146,-154,-418,-197,-276,-206,-27,-6,1,-7,7,-2,0,-1,1,0,1,0,1594,1594,1590,1571,1345,1320,1323,1390,1360,1271,1277,1271,10.920546027,11.613520049,12.090566251,12.171712145,12.258368694,10.98663437,12.725684333,11.354301138,10.00443984,9.7733943177,12.01260063,12.232157921,12.599048009,12.882676639,12.458388696,12.601467768,12.900407688,12.351836639,12.461151399,13.76618346,-1.092054603,-0.618637872,-0.508481758,-0.710964494,-0.200020002,-1.614833398,-0.174723355,-0.997535501,-2.456711558,-3.992789142,0.6440322016,0.3655587425,0.2542408791,0.1137543191,0.028574286,-0.086508932,-0.087361677,-0.117357118,-0.088796803,0.0595938678,-7.280364018,-0.281199033,-8.389949011,-4.265786967,-4.42901433,-11.96706893,-5.649388468,-7.980284004,-6.008583691,-0.864111083,-6.636331817,0.0843597098,-8.135708131,-4.152032647,-4.400440044,-12.05357787,-5.736750146,-8.097641122,-6.097380494,-0.804517215 +050,2,4,19,113,Iowa,Linn County,211226,211242,211713,214242,215542,216567,218223,220392,222299,224553,226060,227241,227854,471,2529,1300,1025,1656,2169,1907,2254,1507,1181,613,762,2633,2771,2707,2716,2892,2820,2794,2781,2703,2674,331,1621,1648,1684,1647,1775,1778,1781,1825,1772,1921,431,1012,1123,1023,1069,1117,1042,1013,956,931,753,95,412,268,429,408,375,367,436,222,471,378,-27,1107,-38,-406,232,698,512,817,335,-228,-528,68,1519,230,23,640,1073,879,1253,557,243,-150,-28,-2,-53,-21,-53,-21,-14,-12,-6,7,10,5166,5166,5318,5276,5202,5117,5182,5217,5257,5196,5126,5133,12.362808278,12.894849506,12.529246093,12.493387612,13.18696351,12.740263525,12.505259012,12.343185838,11.925850594,11.751392566,7.6111326314,7.6689685982,7.7943296714,7.5760712068,8.0936584476,8.0326909741,7.971319363,8.1000770062,7.8182046808,8.4421933882,4.7516756465,5.2258809076,4.7349164216,4.9173164056,5.0933050625,4.7075725506,4.5339396489,4.2431088317,4.107645913,3.3091991782,1.9344766466,1.2471380973,1.9856101123,1.8767680949,1.709927841,1.6580413878,1.9514291085,0.9853244358,2.0780893931,1.6611916193,5.1977321548,-0.176833014,-1.879155491,1.0671818579,3.1827456881,2.3131258598,3.6566917011,1.4868634505,-1.005954101,-2.320394643,7.1322088014,1.0703050835,0.1064546214,2.9439499529,4.8926735292,3.9711672476,5.6081208096,2.4721878863,1.072135292,-0.659203024 +050,2,4,19,115,Iowa,Louisa County,11387,11387,11382,11384,11364,11353,11254,11289,11219,11203,11135,11059,11011,-5,2,-20,-11,-99,35,-70,-16,-68,-76,-48,25,136,139,127,141,155,136,132,136,129,123,12,108,99,105,114,109,100,115,118,97,125,13,28,40,22,27,46,36,17,18,32,-2,2,22,21,48,56,45,46,50,22,55,45,-22,-47,-82,-81,-185,-57,-154,-81,-109,-163,-93,-20,-25,-61,-33,-129,-12,-108,-31,-87,-108,-48,2,-1,1,0,3,1,2,-2,1,0,2,116,116,118,125,123,120,118,122,119,116,117,117,11.947641219,12.220854581,11.181053836,12.474012474,13.751497139,12.084592145,11.774150388,12.176560122,11.62476345,11.146352515,9.487832733,8.7040618956,9.2441783686,10.085371787,9.6704076654,8.8857295184,10.257782535,10.564956576,8.7411011985,11.327594019,2.4598084863,3.5167926851,1.9368754677,2.3886406865,4.0810894735,3.1988626266,1.516367853,1.6116035455,2.8836622511,-0.181241504,1.9327066678,1.8463161597,4.2259101114,4.9542177202,3.9923701371,4.0874355785,4.45990545,1.9697376668,4.956294494,4.0779338469,-4.128964245,-7.209425004,-7.131223313,-16.36661211,-5.057002174,-13.68402346,-7.225046829,-9.759154803,-14.68865459,-8.42772995,-2.196257577,-5.363108845,-2.905313202,-11.41239439,-1.064632037,-9.59658788,-2.765141379,-7.789417137,-9.732360097,-4.349796103 +050,2,4,19,117,Iowa,Lucas County,8898,8900,8897,8879,8777,8695,8633,8609,8565,8537,8590,8561,8518,-3,-18,-102,-82,-62,-24,-44,-28,53,-29,-43,26,115,82,97,91,104,105,108,128,99,100,19,100,109,112,101,121,124,114,118,88,96,7,15,-27,-15,-10,-17,-19,-6,10,11,4,3,16,2,0,0,0,0,-1,-1,-1,0,-13,-48,-77,-68,-53,-5,-24,-21,45,-39,-48,-10,-32,-75,-68,-53,-5,-24,-22,44,-40,-48,0,-1,0,1,1,-2,-1,0,-1,0,1,78,78,84,78,75,73,76,71,73,65,63,63,12.938793879,9.2886270956,11.103479853,10.503231764,12.063565712,12.227786188,12.630101742,14.947159456,11.544516355,11.710287488,11.251125113,12.347077481,12.820512821,11.657433056,14.035494722,14.440433213,13.331774062,13.779412623,10.261792315,11.241875988,1.6876687669,-3.058450385,-1.717032967,-1.154201293,-1.971929011,-2.212647025,-0.701672319,1.1677468325,1.2827240394,0.4684114995,1.800180018,0.2265518804,0,0,0,0,-0.116945387,-0.116774683,-0.116611276,0,-5.400540054,-8.722247395,-7.783882784,-6.117266851,-0.579979121,-2.794922557,-2.455853117,5.2548607462,-4.547839776,-5.620937994,-3.600360036,-8.495695514,-7.783882784,-6.117266851,-0.579979121,-2.794922557,-2.572798503,5.1380860629,-4.664451052,-5.620937994 +050,2,4,19,119,Iowa,Lyon County,11581,11581,11569,11694,11761,11700,11709,11755,11800,11791,11849,11806,11756,-12,125,67,-61,9,46,45,-9,58,-43,-50,48,186,150,162,173,163,186,157,197,159,174,49,106,120,124,97,107,101,111,114,103,108,-1,80,30,38,76,56,85,46,83,56,66,0,0,2,1,1,1,8,6,6,10,8,-11,46,37,-101,-70,-12,-48,-61,-31,-109,-124,-11,46,39,-100,-69,-11,-40,-55,-25,-99,-116,0,-1,-2,1,2,1,0,0,0,0,0,161,161,161,165,155,162,165,168,169,166,166,166,15.991058763,12.790449797,13.81015302,14.780639925,13.893624275,15.792825302,13.310160654,16.666666667,13.443246671,14.769544181,9.1131840261,10.232359838,10.57073441,8.2874108249,9.1203545857,8.5756739546,9.4103683608,9.6446700508,8.7085182837,9.167303285,6.8778747367,2.5580899595,3.2394186096,6.4932290999,4.7732696897,7.2171513479,3.8997922937,7.0219966159,4.7347283872,5.6022408964,0,0.1705393306,0.0852478581,0.085437225,0.0852369587,0.6792613033,0.50866856,0.5076142132,0.845487212,0.6790595026,3.9547779736,3.1549776167,-8.610033673,-5.98060575,-1.022843505,-4.07556782,-5.171463694,-2.622673435,-9.215810611,-10.52542229,3.9547779736,3.3255169473,-8.524785815,-5.895168525,-0.937606546,-3.396306517,-4.662795134,-2.115059222,-8.370323399,-9.846362788 +050,2,4,19,121,Iowa,Madison County,15679,15681,15738,15738,15639,15482,15620,15727,15800,16005,16140,16273,16521,57,0,-99,-157,138,107,73,205,135,133,248,61,159,172,161,165,159,176,162,153,179,173,45,154,127,166,136,137,165,149,158,146,156,16,5,45,-5,29,22,11,13,-5,33,17,5,5,2,17,17,8,6,6,4,6,6,34,-9,-147,-173,95,78,57,185,138,93,228,39,-4,-145,-156,112,86,63,191,142,99,234,2,-1,1,4,-3,-1,-1,1,-2,1,-3,192,192,201,190,190,191,189,169,171,147,148,148,10.10293557,10.963444561,10.346711224,10.610250145,10.144511437,11.165033146,10.187077504,9.5193653756,11.0449511,10.550710496,9.7852331935,8.0951015075,10.668037659,8.7454183011,8.7408683447,10.467218575,9.3695959755,9.8304557474,9.0087310647,9.513935476,0.3177023764,2.8683430538,-0.321326436,1.8648318436,1.4036430918,0.6978145716,0.8174815281,-0.311090372,2.0362200352,1.0367750198,0.3177023764,0.1274819135,1.0925098808,1.0931772876,0.5104156698,0.38062613,0.3772991668,0.2488722974,0.3702218246,0.3659205952,-0.571864278,-9.369920643,-11.11789467,6.1089319015,4.9765527802,3.6159482348,11.633390976,8.5860942604,5.7384382809,13.904982619,-0.254161901,-9.242438729,-10.02538479,7.2021091891,5.4869684499,3.9965743648,12.010690143,8.8349665578,6.1086601055,14.270903214 +050,2,4,19,123,Iowa,Mahaska County,22381,22384,22409,22506,22407,22432,22466,22417,22325,22422,22203,22429,22370,25,97,-99,25,34,-49,-92,97,-219,226,-59,73,305,246,286,270,295,312,243,262,283,263,30,222,235,241,219,227,243,241,244,232,250,43,83,11,45,51,68,69,2,18,51,13,3,13,7,40,38,33,41,40,22,39,27,-19,2,-116,-61,-47,-151,-201,57,-260,137,-101,-16,15,-109,-21,-9,-118,-160,97,-238,176,-74,-2,-1,-1,1,-8,1,-1,-2,1,-1,2,659,659,663,699,719,801,769,769,870,872,995,995,13.58120895,10.954512057,12.756751935,12.027261793,13.145288862,13.94662733,10.861063312,11.742296919,12.681484137,11.741333512,9.8853389736,10.464676152,10.749570686,9.7554456769,10.115188379,10.862277055,10.771671844,10.93557423,10.396128338,11.160963414,3.6958699766,0.489835905,2.0071812485,2.2718161165,3.0301004835,3.0843502749,0.0893914676,0.8067226891,2.2853557985,0.5803700975,0.5788712012,0.3117137577,1.7841611097,1.6927257339,1.4704899405,1.8327298735,1.7878293517,0.9859943978,1.7476250224,1.2053840488,0.0890571079,-5.165542271,-2.720845692,-2.09363446,-6.728605485,-8.984846453,2.5476568262,-11.65266106,6.1390930274,-4.509029219,0.667928309,-4.853828513,-0.936684583,-0.400908726,-5.258115545,-7.15211658,4.3354861778,-10.66666667,7.8867180498,-3.303645171 +050,2,4,19,125,Iowa,Marion County,33309,33307,33225,33274,33277,33019,33280,33123,33157,33107,33251,33280,33168,-82,49,3,-258,261,-157,34,-50,144,29,-112,84,384,334,383,381,363,371,403,323,355,336,100,312,325,356,323,350,326,380,328,325,365,-16,72,9,27,58,13,45,23,-5,30,-29,8,19,13,12,18,7,14,12,4,8,8,-77,-40,-14,-302,189,-179,-24,-83,146,-7,-92,-69,-21,-1,-290,207,-172,-10,-71,150,1,-84,3,-2,-5,5,-4,2,-1,-2,-1,-2,1,1693,1693,1669,1600,1440,1545,1412,1378,1402,1287,1326,1326,11.54904585,10.037414915,11.554241583,11.493386024,10.933240968,11.194930597,12.163467343,9.7350733898,10.671716944,10.113171202,9.3835997534,9.7669456507,10.739712803,9.7437367079,10.541692393,9.8370549185,11.469274417,9.8857711203,9.7698817093,10.986034192,2.1654460969,0.2704692642,0.81452878,1.749649316,0.3915485746,1.3578756789,0.6941929253,-0.15069773,0.9018352347,-0.872862991,0.5714371645,0.390677826,0.3620127911,0.5429946153,0.2108338479,0.4224502112,0.3621876132,0.1205581844,0.2404893959,0.2407897905,-1.203025609,-0.420729966,-9.110655243,5.7014434607,-5.391322681,-0.724200362,-2.505130991,4.4003737304,-0.210428221,-2.769082591,-0.631588445,-0.03005214,-8.748642452,6.244438076,-5.180488833,-0.301750151,-2.142943378,4.5209319148,0.0300611745,-2.5282928 +050,2,4,19,127,Iowa,Marshall County,40648,40648,40722,41013,41032,40993,40712,40340,40122,40051,39879,39472,39495,74,291,19,-39,-281,-372,-218,-71,-172,-407,23,147,538,552,589,551,516,527,490,554,490,490,138,458,459,501,450,509,470,481,493,470,476,9,80,93,88,101,7,57,9,61,20,14,68,168,126,180,103,111,112,24,40,179,144,2,44,-199,-309,-494,-494,-388,-102,-275,-605,-135,70,212,-73,-129,-391,-383,-276,-78,-235,-426,9,-5,-1,-1,2,9,4,1,-2,2,-1,0,1375,1375,1340,1409,1390,1337,1301,1297,1287,1263,1247,1247,13.164495014,13.456030227,14.36147516,13.487546662,12.732566747,13.099351247,12.223566537,13.862129363,12.350190924,12.410247319,11.206949287,11.188981656,12.21578787,11.015237746,12.559838129,11.68253337,11.99905205,12.33579382,11.846101498,12.055668824,1.957545727,2.2670485709,2.1456872905,2.4723089162,0.1727286187,1.4168178768,0.2245144874,1.5263355436,0.5040894255,0.3545784948,4.1108460268,3.0714851606,4.3889058214,2.5212655284,2.7389823817,2.7839228456,0.5987052998,1.0008757663,4.5116003579,3.6470930895,1.0766501499,-4.850996404,-7.534288327,-12.09228321,-12.18970537,-9.644304144,-2.544497524,-6.881020893,-15.24870512,-3.419149771,5.1874961767,-1.779511244,-3.145382505,-9.571017686,-9.450722993,-6.860381298,-1.945792224,-5.880145127,-10.73710476,0.2279433181 +050,2,4,19,129,Iowa,Mills County,15059,15059,15076,15031,14874,14907,14763,14885,15041,15060,15122,15124,14766,17,-45,-157,33,-144,122,156,19,62,2,-358,30,156,150,154,153,166,140,152,141,135,135,18,143,157,152,127,128,119,137,117,152,151,12,13,-7,2,26,38,21,15,24,-17,-16,3,0,-1,0,-2,7,5,0,0,4,4,3,-57,-152,33,-172,78,131,5,39,14,-344,6,-57,-153,33,-174,85,136,5,39,18,-340,-1,-1,3,-2,4,-1,-1,-1,-1,1,-2,608,608,606,608,607,566,560,560,565,566,538,537,10.363038496,10.031767263,10.342164467,10.313447927,11.198057205,9.3564124841,10.099332248,9.3433172089,8.926800238,9.0331214453,9.4994519547,10.499916402,10.207850643,8.5608358611,8.6346465192,7.9529506115,9.1026876184,7.7529653436,10.050915824,10.103713617,0.8635865413,-0.468149139,0.1343138243,1.7526120661,2.5634106854,1.4034618726,0.9966446297,1.5903518654,-1.124115586,-1.070592171,0,-0.066878448,0,-0.134816313,0.4722072315,0.3341575887,0,0,0.2644977848,0.2676480428,-3.786494835,-10.16552416,2.2161781001,-11.5942029,5.2617377226,8.7549288244,0.3322148766,2.5843217812,0.9257422469,-23.01773168,-3.786494835,-10.23240261,2.2161781001,-11.72901921,5.7339449541,9.0890864132,0.3322148766,2.5843217812,1.1902400317,-22.75008364 +050,2,4,19,131,Iowa,Mitchell County,10776,10776,10793,10709,10714,10663,10694,10670,10650,10544,10536,10565,10647,17,-84,5,-51,31,-24,-20,-106,-8,29,82,48,120,113,120,131,116,125,117,131,118,131,39,134,133,139,124,135,121,152,149,127,129,9,-14,-20,-19,7,-19,4,-35,-18,-9,2,1,6,2,1,4,1,1,1,1,1,1,9,-76,25,-32,23,-6,-24,-71,10,36,80,10,-70,27,-31,27,-5,-23,-70,11,37,81,-2,0,-2,-1,-3,0,-1,-1,-1,1,-1,247,247,238,238,238,234,242,244,191,196,214,214,11.161752395,10.549409513,11.227019694,12.267640586,10.859389627,11.726078799,11.040860621,12.428842505,11.184304061,12.351499151,12.463956841,12.416561639,13.004631146,11.612117807,12.638082756,11.350844278,14.343682174,14.136622391,12.037344202,12.162926645,-1.302204446,-1.867152126,-1.777611452,0.6555227794,-1.778693129,0.3752345216,-3.302821553,-1.707779886,-0.85304014,0.1885725061,0.5580876198,0.1867152126,0.0935584975,0.3745844454,0.0936154278,0.0938086304,0.0943663301,0.0948766603,0.0947822378,0.0942862531,-7.06910985,2.3339401578,-2.993871918,2.1538605609,-0.561692567,-2.251407129,-6.700009437,0.9487666034,3.4121605611,7.5429002451,-6.51102223,2.5206553704,-2.900313421,2.5284450063,-0.468077139,-2.157598499,-6.605643107,1.0436432638,3.5069427989,7.6371864982 +050,2,4,19,133,Iowa,Monona County,9243,9243,9249,9238,9090,9030,8898,8865,8779,8721,8649,8626,8598,6,-11,-148,-60,-132,-33,-86,-58,-72,-23,-28,21,76,83,93,78,95,88,92,92,87,92,20,144,145,162,168,135,158,139,136,132,147,1,-68,-62,-69,-90,-40,-70,-47,-44,-45,-55,2,4,1,4,3,-1,0,-1,-1,-1,-1,5,53,-88,5,-46,11,-15,-10,-26,23,29,7,57,-87,9,-43,10,-15,-11,-27,22,28,-2,0,1,0,1,-3,-1,0,-1,0,-1,200,200,198,200,201,202,205,202,204,197,193,193,8.2219938335,9.0571802706,10.264900662,8.7014725569,10.696391375,9.9750623441,10.514285714,10.592976396,10.0723589,10.68276823,15.578514632,15.82278481,17.880794702,18.741633199,15.200135112,17.909771027,15.885714286,15.659182499,15.282199711,17.069205759,-7.356520798,-6.76560454,-7.61589404,-10.04016064,-4.503743737,-7.934708683,-5.371428571,-5.066206102,-5.20984081,-6.386437529,0.4327365176,0.1091226539,0.4415011038,0.3346720214,-0.112593593,0,-0.114285714,-0.115141048,-0.11577424,-0.116117046,5.7337588576,-9.60279354,0.5518763797,-5.131637662,1.2385295277,-1.700294718,-1.142857143,-2.993667242,2.6628075253,3.3673943335,6.1664953751,-9.493670886,0.9933774834,-4.79696564,1.1259359342,-1.700294718,-1.257142857,-3.10880829,2.5470332851,3.2512772875 +050,2,4,19,135,Iowa,Monroe County,7970,7967,7993,8057,8070,7974,7952,7919,7835,7782,7738,7681,7770,26,64,13,-96,-22,-33,-84,-53,-44,-57,89,22,104,72,90,86,85,99,69,86,90,85,7,123,77,108,121,119,107,113,108,80,77,15,-19,-5,-18,-35,-34,-8,-44,-22,10,8,2,3,3,8,5,2,1,0,0,0,0,9,80,17,-85,9,1,-78,-8,-22,-66,81,11,83,20,-77,14,3,-77,-8,-22,-66,81,0,0,-2,-1,-1,-2,1,-1,0,-1,0,122,122,121,122,122,120,111,115,115,111,107,107,12.959501558,8.9291250698,11.219147345,10.799949768,10.711360343,12.568236638,8.8365243004,11.082474227,11.673908814,11.002524108,15.327102804,9.5492031996,13.462976814,15.195278161,14.99590448,13.58385172,14.471409362,13.917525773,10.376807834,9.9669924277,-2.367601246,-0.62007813,-2.243829469,-4.395328394,-4.284544137,-1.015615082,-5.634885061,-2.835051546,1.2971009793,1.0355316808,0.3738317757,0.3720468779,0.9972575418,0.6279040563,0.2520320081,0.1269518852,0,0,0,0,9.968847352,2.1082656415,-10.59586138,1.1302273013,0.126016004,-9.902247048,-1.024524557,-2.835051546,-8.560866463,10.484758268,10.342679128,2.4803125194,-9.598603839,1.7581313575,0.3780480121,-9.775295163,-1.024524557,-2.835051546,-8.560866463,10.484758268 +050,2,4,19,137,Iowa,Montgomery County,10740,10740,10690,10633,10541,10407,10386,10153,10135,10119,9976,9917,9935,-50,-57,-92,-134,-21,-233,-18,-16,-143,-59,18,27,106,121,107,115,127,127,124,115,93,107,52,147,144,148,152,163,132,142,160,152,150,-25,-41,-23,-41,-37,-36,-5,-18,-45,-59,-43,1,-2,0,9,6,3,5,5,2,8,6,-25,-16,-71,-103,13,-202,-18,-1,-102,-7,54,-24,-18,-71,-94,19,-199,-13,4,-100,1,60,-1,2,2,1,-3,2,0,-2,2,-1,1,213,213,217,206,201,209,197,186,192,192,187,188,9.9423158092,11.429111174,10.215772389,11.061414899,12.366716977,12.519716088,12.244494915,11.445633242,9.350022621,10.7797703,13.787928528,13.601586852,14.130227229,14.62030491,15.87224305,13.012618297,14.021921596,15.924359293,15.281757402,15.111827524,-3.845612719,-2.172475678,-3.914454841,-3.558890011,-3.505526072,-0.492902208,-1.777426681,-4.478726051,-5.931734781,-4.332057223,-0.187590864,0,0.8592705748,0.5771172991,0.2921271727,0.4929022082,0.4937296337,0.1990544912,0.8043030212,0.6044731009,-1.500726915,-6.706337962,-9.833874356,1.2504208147,-19.66989629,-1.77444795,-0.098745927,-10.15177905,-0.703765144,5.4402579085,-1.688317779,-6.706337962,-8.974603781,1.8275381138,-19.37776912,-1.281545741,0.3949837069,-9.952724558,0.1005378776,6.0447310095 +050,2,4,19,139,Iowa,Muscatine County,42745,42803,42804,42847,42922,43018,43032,43069,42942,42825,42784,42571,42394,1,43,75,96,14,37,-127,-117,-41,-213,-177,137,554,534,536,576,522,533,541,549,521,512,60,381,407,395,408,399,413,431,421,395,392,77,173,127,141,168,123,120,110,128,126,120,13,47,28,118,95,102,71,83,63,75,66,-91,-176,-75,-162,-250,-187,-318,-309,-234,-415,-362,-78,-129,-47,-44,-155,-85,-247,-226,-171,-340,-296,2,-1,-5,-1,1,-1,0,-1,2,1,-1,553,553,553,552,554,548,557,557,536,547,553,553,12.936217908,12.45205144,12.473818943,13.387565369,12.125294712,12.393763588,12.615574755,12.825754302,12.207837854,12.052021421,8.8965686332,9.4906084949,9.1924598557,9.482858803,9.2681850385,9.603422818,10.050485618,9.8354145008,9.2554624802,9.2273289001,4.0396492744,2.9614429456,3.2813590877,3.904706566,2.8571096735,2.7903407704,2.5650891368,2.9903398007,2.9523753734,2.8246925204,1.0974769705,0.6529165549,2.7461019316,2.2080185938,2.369310461,1.6509516225,1.9354763487,1.4718078707,1.7573662937,1.5535808862,-4.109700996,-1.748883629,-3.770072143,-5.810575247,-4.343735845,-7.394403041,-7.205568575,-5.466714948,-9.724093492,-8.52115577,-3.012224025,-1.095967074,-1.023970212,-3.602556653,-1.974425384,-5.743451419,-5.270092227,-3.994907078,-7.966727198,-6.967574884 +050,2,4,19,141,Iowa,O'Brien County,14398,14398,14405,14217,14154,14046,14045,13927,13921,13777,13806,13796,13679,7,-188,-63,-108,-1,-118,-6,-144,29,-10,-117,52,137,154,165,167,179,173,161,179,163,160,34,189,189,172,183,202,199,198,218,181,181,18,-52,-35,-7,-16,-23,-26,-37,-39,-18,-21,0,9,3,5,9,6,1,1,0,1,2,-10,-144,-30,-108,4,-99,21,-107,69,7,-98,-10,-135,-27,-103,13,-93,22,-106,69,8,-96,-1,-1,-1,2,2,-2,-2,-1,-1,0,0,366,366,367,367,370,372,383,379,397,401,410,410,9.5730556914,10.856155934,11.70212766,11.889929159,12.798512799,12.424590635,11.625388115,12.97900881,11.810738352,11.646951774,13.206624275,13.323464101,12.19858156,13.029084048,14.443014443,14.291870152,14.29706116,15.806837545,13.114991667,13.175614195,-3.633568584,-2.467308167,-0.496453901,-1.139154889,-1.644501645,-1.867279517,-2.671673045,-2.827828735,-1.304253315,-1.52866242,0.6288868702,0.2114835572,0.3546099291,0.6407746253,0.429000429,0.071818443,0.0722073796,0,0.0724585175,0.1455868972,-10.06218992,-2.114835572,-7.659574468,0.2847887224,-7.078507079,1.5081873025,-7.726189617,5.0030816082,0.5072096225,-7.133757962,-9.433303054,-1.903352014,-7.304964539,0.9255633477,-6.64950665,1.5800057455,-7.653982237,5.0030816082,0.57966814,-6.988171065 +050,2,4,19,143,Iowa,Osceola County,6462,6462,6458,6315,6203,6236,6231,6161,6089,6024,6020,5961,5987,-4,-143,-112,33,-5,-70,-72,-65,-4,-59,26,15,57,63,86,76,86,69,65,62,63,63,9,84,58,75,65,76,74,78,65,64,75,6,-27,5,11,11,10,-5,-13,-3,-1,-12,5,3,2,10,8,8,6,2,2,9,7,-15,-120,-123,12,-25,-88,-72,-55,-3,-66,31,-10,-117,-121,22,-17,-80,-66,-53,-1,-57,38,0,1,4,0,1,0,-1,1,0,-1,0,112,112,108,106,99,104,91,96,82,96,106,107,8.9250763329,10.065505672,13.827478093,12.192187375,13.879922531,11.265306122,10.732271114,10.295582863,10.516651365,10.545698025,13.15274407,9.2666560153,12.058847174,10.427528676,12.26597805,12.081632653,12.878725336,10.793756227,10.683582339,12.55440241,-4.227667737,0.7988496565,1.7686309189,1.764658699,1.6139444803,-0.816326531,-2.146454223,-0.498173364,-0.166930974,-2.008704386,0.4697408596,0.3195398626,1.6078462899,1.2833881447,1.2911555842,0.9795918367,0.3302237266,0.3321155762,1.5023787664,1.171744225,-18.78963439,-19.65170155,1.9294155479,-4.010587952,-14.20271143,-11.75510204,-9.081152481,-0.498173364,-11.01744429,5.1891529963,-18.31989353,-19.33216169,3.5372618378,-2.727199807,-12.91155584,-10.7755102,-8.750928754,-0.166057788,-9.51506552,6.3608972213 +050,2,4,19,145,Iowa,Page County,15932,15946,15920,15900,15705,15521,15487,15466,15343,15253,15227,15129,15073,-26,-20,-195,-184,-34,-21,-123,-90,-26,-98,-56,42,173,178,173,172,175,158,165,130,144,131,74,209,216,204,181,221,196,213,194,188,206,-32,-36,-38,-31,-9,-46,-38,-48,-64,-44,-75,2,9,4,17,16,12,22,15,12,28,22,7,7,-163,-174,-38,16,-108,-56,26,-80,-3,9,16,-159,-157,-22,28,-86,-41,38,-52,19,-3,0,2,4,-3,-3,1,-1,0,-2,0,1479,1479,1488,1505,1372,1453,1454,1453,1483,1520,1525,1523,10.873664362,11.2640405,11.080509832,11.093911249,11.307466158,10.256743159,10.785723624,8.530183727,9.4874159968,8.6749221906,13.136392206,13.668723303,13.066034715,11.674406605,14.279714406,12.723554805,13.923388678,12.729658793,12.386348663,13.641480697,-2.262727844,-2.404682803,-1.985524883,-0.580495356,-2.972248247,-2.466811646,-3.137665054,-4.199475066,-2.898932666,-4.966558506,0.565681961,0.2531245056,1.0888362262,1.0319917441,0.775369108,1.4281541108,0.9805203295,0.7874015748,1.8447753327,1.4568571618,0.4399748586,-10.3148236,-11.14455902,-2.450980392,1.0338254773,-7.010938362,-3.66060923,1.7060367454,-5.270786665,-0.19866234,1.0056568196,-10.0616991,-10.0557228,-1.418988648,1.8091945853,-5.582784251,-2.680088901,2.4934383202,-3.426011332,1.2581948215 +050,2,4,19,147,Iowa,Palo Alto County,9421,9421,9398,9354,9278,9163,9120,9137,9032,9045,8910,8873,8845,-23,-44,-76,-115,-43,17,-105,13,-135,-37,-28,21,104,87,97,105,117,113,101,110,102,98,16,139,123,135,126,142,128,128,125,134,123,5,-35,-36,-38,-21,-25,-15,-27,-15,-32,-25,2,11,6,14,20,21,22,23,13,24,20,-32,-20,-46,-91,-43,21,-112,19,-132,-29,-23,-30,-9,-40,-77,-23,42,-90,42,-119,-5,-3,2,0,0,0,1,0,0,-2,-1,0,0,344,344,321,328,317,326,299,279,271,264,251,251,11.092150171,9.3387720052,10.520036874,11.486079965,12.817001698,12.438769332,11.174420534,12.252854358,11.471630209,11.062196636,14.825085324,13.203091456,14.641288433,13.783295958,15.555677274,14.089933403,14.161641865,13.923698134,15.070573019,13.884185574,-3.732935154,-3.86431945,-4.121251559,-2.297215993,-2.738675576,-1.651164071,-2.987221331,-1.670843776,-3.598942811,-2.821988938,1.1732081911,0.6440532417,1.5183558375,2.1878247552,2.3004874843,2.4217073036,2.5446700227,1.448064606,2.6992071079,2.2575911502,-2.133105802,-4.93774152,-9.869312944,-4.703823224,2.3004874843,-12.32869173,2.1021187144,-14.70342523,-3.261541922,-2.596229823,-0.959897611,-4.293688278,-8.350957106,-2.515998469,4.6009749685,-9.906984424,4.6467887371,-13.25536062,-0.562334814,-0.338638673 +050,2,4,19,149,Iowa,Plymouth County,24986,24986,24978,24824,24836,24937,24918,24912,25207,25053,25024,25200,25219,-8,-154,12,101,-19,-6,295,-154,-29,176,19,55,296,274,284,279,304,300,271,299,258,277,58,236,252,246,231,263,222,255,270,230,236,-3,60,22,38,48,41,78,16,29,28,41,2,7,7,27,40,30,29,7,3,17,10,-7,-221,-16,37,-109,-75,190,-176,-61,133,-32,-5,-214,-9,64,-69,-45,219,-169,-58,150,-22,0,0,-1,-1,2,-2,-2,-1,0,-2,0,349,349,348,347,350,353,351,349,289,284,283,284,11.887072808,11.03503826,11.411809616,11.192458129,12.201485049,11.971507811,10.783923597,11.941609921,10.273972603,10.98792122,9.4775310229,10.14901329,9.8848773431,9.2668739344,10.555890026,8.8589157804,10.147234381,10.783393574,9.1589678241,9.3615502092,2.4095417855,0.8860249698,1.5269322725,1.9255841942,1.6455950231,3.112592031,0.6366892161,1.1582163468,1.1150047786,1.6263710109,0.2811132083,0.2819170358,1.0849255621,1.6046534951,1.2040939193,1.1572457551,0.278551532,0.1198154842,0.676967187,0.3966758563,-8.875145576,-0.644381796,1.4867498443,-4.372680774,-3.010234798,7.5819549472,-7.003581377,-2.436248178,5.2962726983,-1.26936274,-8.594032368,-0.36246476,2.5716754063,-2.768027279,-1.806140879,8.7392007023,-6.725029845,-2.316432694,5.9732398853,-0.872686884 +050,2,4,19,151,Iowa,Pocahontas County,7310,7310,7290,7203,7143,7112,7099,6970,6845,6830,6709,6632,6607,-20,-87,-60,-31,-13,-129,-125,-15,-121,-77,-25,16,72,70,83,81,86,72,79,74,74,71,14,110,71,122,86,94,99,91,111,86,85,2,-38,-1,-39,-5,-8,-27,-12,-37,-12,-14,0,1,0,0,2,5,1,-1,-1,1,1,-23,-51,-60,7,-10,-128,-99,-1,-83,-67,-12,-23,-50,-60,7,-8,-123,-98,-2,-84,-66,-11,1,1,1,1,0,2,0,-1,0,1,0,141,141,137,135,136,123,109,104,100,98,96,95,9.9358310909,9.7588177889,11.645036829,11.399620013,12.225460232,10.423452769,11.55393053,10.931383411,11.093621168,10.725885641,15.179741944,9.8982294716,17.116801122,12.10330026,13.362712346,14.332247557,13.308957952,16.397075116,12.892586763,12.840849007,-5.243910854,-0.139411683,-5.471764293,-0.703680248,-1.137252115,-3.908794788,-1.755027422,-5.465691705,-1.798965595,-2.114963366,0.137997654,0,0,0.2814720991,0.7107825716,0.1447701773,-0.146252285,-0.147721397,0.1499137996,0.1510688118,-7.037880356,-8.364700962,0.9821115398,-1.407360495,-18.19603383,-14.33224756,-0.146252285,-12.26087599,-10.04422457,-1.812825742,-6.899882702,-8.364700962,0.9821115398,-1.125888396,-17.48525126,-14.18747738,-0.29250457,-12.40859739,-9.894310771,-1.66175693 +050,2,4,19,153,Iowa,Polk County,430640,430631,432360,438783,444753,452780,461069,467517,474593,480962,486222,491031,494281,1729,6423,5970,8027,8289,6448,7076,6369,5260,4809,3250,1631,6478,6659,6744,6876,6969,6992,7008,6772,6554,6524,778,3104,3096,3273,3214,3529,3376,3756,3642,3519,3966,853,3374,3563,3471,3662,3440,3616,3252,3130,3035,2558,424,1633,971,1486,1370,975,1064,1214,452,1232,964,447,1414,1472,3018,3210,2048,2396,1902,1669,522,-309,871,3047,2443,4504,4580,3023,3460,3116,2121,1754,655,5,2,-36,52,47,-15,0,1,9,20,37,9356,9356,9816,9757,9722,9889,9636,9564,9433,9410,9362,9364,14.872414747,15.073522754,15.0278597,15.04843798,15.009918306,14.843277324,14.667915505,14.003540174,13.413107967,13.242505927,7.1262697399,7.0082034009,7.2933251479,7.0339848268,7.6008038028,7.1668913397,7.8613999194,7.5311419544,7.2018197949,8.0502419538,7.7461450072,8.0653193531,7.7345345519,8.0144531536,7.4091145031,7.6763859847,6.8065155852,6.47239822,6.211288172,5.1922639732,3.7490974501,2.1979862733,3.3112988603,2.9983071602,2.0999670467,2.2587595928,2.5409317098,0.934672203,2.5213532217,1.956740606,3.2463097333,3.3320656996,6.7251009155,7.0252306453,4.4110077042,5.0864548726,3.9809325471,3.451256431,1.0683006345,-0.627212497,6.9954071834,5.530051973,10.036399776,10.023537805,6.5109747509,7.3452144654,6.5218642569,4.3859286341,3.5896538563,1.3295281089 +050,2,4,19,155,Iowa,Pottawattamie County,93158,93149,93363,93517,92965,92923,93332,93657,93649,93563,93445,93405,93328,214,154,-552,-42,409,325,-8,-86,-118,-40,-77,326,1254,1208,1154,1200,1202,1191,1172,1141,1059,1058,232,839,868,889,925,913,881,946,957,947,1042,94,415,340,265,275,289,310,226,184,112,16,19,12,20,95,80,45,56,39,27,94,82,104,-272,-928,-396,77,3,-372,-349,-329,-246,-176,123,-260,-908,-301,157,48,-316,-310,-302,-152,-94,-3,-1,16,-6,-23,-12,-2,-2,0,0,1,2076,2076,2184,2202,2213,2279,2214,2068,2115,1969,1982,1981,13.420376712,12.955674006,12.416078499,12.885560119,12.85637123,12.717158019,12.520564921,12.202686516,11.335295692,11.33168749,8.9790239726,9.3092094679,9.5648992942,9.9326192585,9.7652803106,9.4070665115,10.106189774,10.234856263,10.136473107,11.160319815,4.4413527397,3.6464645381,2.8511792047,2.9529408606,3.0910909198,3.310091508,2.4143751469,1.9678302533,1.198822585,0.1713676747,0.1284246575,0.214497914,1.022120847,0.8590373413,0.4813117349,0.5979520144,0.416639959,0.2887577002,1.0061546695,0.8782593328,-2.910958904,-9.95270321,-4.260630057,0.826823441,0.032087449,-3.97210981,-3.728393479,-3.518566051,-2.633128178,-1.885044422,-2.782534247,-9.738205296,-3.23850921,1.6858607823,0.5133991839,-3.374157795,-3.31175352,-3.22980835,-1.626973508,-1.006785089 +050,2,4,19,157,Iowa,Poweshiek County,18914,18915,18926,18900,18734,18618,18624,18379,18297,18359,18461,18458,18381,11,-26,-166,-116,6,-245,-82,62,102,-3,-77,57,182,182,172,176,186,167,168,183,155,161,39,220,237,237,234,226,203,225,203,222,221,18,-38,-55,-65,-58,-40,-36,-57,-20,-67,-60,8,48,25,38,47,36,33,36,17,34,29,-15,-35,-140,-86,20,-243,-79,83,105,31,-47,-7,13,-115,-48,67,-207,-46,119,122,65,-18,0,-1,4,-3,-3,2,0,0,0,-1,1,1627,1627,1647,1621,1612,1625,1587,1541,1595,1612,1639,1639,9.6230106276,9.6721050114,9.2096808738,9.4516943236,10.053238927,9.1067728215,9.1663029245,9.9402498642,8.3967604756,8.7407367192,11.632210649,12.594993889,12.69008353,12.566457226,12.215225793,11.069909478,12.27629856,11.02661597,12.026327907,11.99815413,-2.009200021,-2.922888877,-3.480402656,-3.114762902,-2.161986866,-1.963136656,-3.109995635,-1.086366105,-3.629567431,-3.257417411,2.5379368688,1.3285858532,2.0346969372,2.5240320069,1.9457881793,1.7995419348,1.9642077695,0.9234111896,1.8418700398,1.5744184153,-1.850578967,-7.440080778,-4.604840437,1.0740561731,-13.13407021,-4.307994329,4.5285901353,5.7034220532,1.6793520951,-2.551643639,0.687357902,-6.111494925,-2.5701435,3.59808818,-11.18828203,-2.508452394,6.4927979048,6.6268332428,3.5212221349,-0.977225223 +050,2,4,19,159,Iowa,Ringgold County,5131,5130,5113,5048,5025,4971,4961,4978,4994,5029,4921,4866,4801,-17,-65,-23,-54,-10,17,16,35,-108,-55,-65,10,55,47,53,51,57,68,59,53,48,47,29,94,70,77,64,86,80,77,87,71,66,-19,-39,-23,-24,-13,-29,-12,-18,-34,-23,-19,0,0,1,0,2,4,4,4,2,4,3,3,-27,-2,-30,1,41,25,49,-75,-37,-49,3,-27,-1,-30,3,45,29,53,-73,-33,-46,-1,1,1,0,0,1,-1,0,-1,1,0,179,179,174,183,182,180,174,175,175,177,177,177,10.825706131,9.3318772957,10.604241697,10.269834877,11.469966797,13.638186923,11.772922279,10.653266332,9.8089302135,9.7238026275,18.502115933,13.898540653,15.406162465,12.887635924,17.30556394,16.044925792,15.364661279,17.487437186,14.509042608,13.654701562,-7.676409802,-4.566663357,-4.801920768,-2.617801047,-5.835597143,-2.406738869,-3.591739,-6.834170854,-4.700112394,-3.930898935,0,0.1985505808,0,0.4027386226,0.8049099507,0.8022462896,0.7981642223,0.4020100503,0.8174108511,0.6206682528,-5.314437555,-0.397101162,-6.00240096,0.2013693113,8.2503269947,5.0140393101,9.777511723,-15.07537688,-7.561050373,-10.13758146,-5.314437555,-0.198550581,-6.00240096,0.604107934,9.0552369454,5.8162855997,10.575675945,-14.67336683,-6.743639522,-9.51691321 +050,2,4,19,161,Iowa,Sac County,10350,10350,10355,10223,10161,10028,10046,9961,9804,9797,9675,9675,9603,5,-132,-62,-133,18,-85,-157,-7,-122,0,-72,35,90,109,103,133,108,103,125,93,119,108,38,142,135,142,149,145,136,135,149,126,119,-3,-52,-26,-39,-16,-37,-33,-10,-56,-7,-11,0,0,0,0,0,0,0,-1,-1,-1,-1,10,-81,-35,-94,36,-48,-125,6,-66,8,-59,10,-81,-35,-94,36,-48,-125,5,-67,7,-60,-2,1,-1,0,-2,0,1,-2,1,0,-1,223,223,216,222,207,205,200,178,182,184,167,167,8.7472057537,10.69466248,10.203576205,13.250971406,10.796221323,10.422463951,12.754451304,9.5521774856,12.299741602,11.204481793,13.801146856,13.245682889,14.067066224,14.845073229,14.494926776,13.761699975,13.774807408,15.304026294,13.023255814,12.345679012,-5.053941102,-2.551020408,-3.863490019,-1.594101823,-3.698705453,-3.339236023,-1.020356104,-5.751848809,-0.723514212,-1.14119722,0,0,0,0,0,0,-0.10203561,-0.102711586,-0.103359173,-0.103745202,-7.872485178,-3.434065934,-9.312001585,3.5867291023,-4.798320588,-12.6486213,0.6122136626,-6.778964667,0.826873385,-6.120966905,-7.872485178,-3.434065934,-9.312001585,3.5867291023,-4.798320588,-12.6486213,0.5101780521,-6.881676253,0.7235142119,-6.224712107 +050,2,4,19,163,Iowa,Scott County,165224,165227,165291,166686,168433,170321,171457,172072,172361,172691,173019,173400,173216,64,1395,1747,1888,1136,615,289,330,328,381,-184,520,2183,2242,2214,2300,2261,2234,2153,2126,2065,2046,312,1431,1428,1462,1437,1497,1481,1570,1587,1491,1571,208,752,814,752,863,764,753,583,539,574,475,36,196,147,313,330,271,258,232,105,270,219,-185,450,797,824,-25,-402,-722,-479,-312,-467,-884,-149,646,944,1137,305,-131,-464,-247,-207,-197,-665,5,-3,-11,-1,-32,-18,0,-6,-4,4,6,3334,3334,3358,3488,3498,3577,3502,3365,3398,3386,3375,3377,13.151513508,13.380321617,13.071432367,13.45902896,13.163371942,12.97204391,12.479278486,12.299326025,11.921978875,11.805571584,8.6210791711,8.5223457936,8.631632394,8.4089672243,8.7154214055,8.5996405687,9.1000776695,9.1811055509,8.6080728828,9.0647863919,4.5304343373,4.8579758235,4.4397999728,5.050061736,4.4479505369,4.3724033411,3.3792008161,3.1182204738,3.3139059925,2.7407851917,1.1808046943,0.8773003023,1.8479486589,1.9310780682,1.5777416172,1.4981142922,1.3447248531,0.6074455468,1.5588059546,1.2636462252,2.7110311859,4.756519326,4.8648872043,-0.146293793,-2.340413764,-4.19239736,-2.776393123,-1.804981053,-2.696156966,-5.100745494,3.8918358802,5.6338196283,6.7128358632,1.7847842752,-0.762672147,-2.694283068,-1.43166827,-1.197535507,-1.137351011,-3.837099268 +050,2,4,19,165,Iowa,Shelby County,12167,12174,12179,11997,12032,11905,11886,11799,11662,11584,11564,11479,11430,5,-182,35,-127,-19,-87,-137,-78,-20,-85,-49,30,117,125,123,117,133,112,104,107,132,126,33,158,131,120,154,167,155,149,155,136,138,-3,-41,-6,3,-37,-34,-43,-45,-48,-4,-12,0,2,10,11,13,0,-1,-2,-2,-2,-2,10,-145,32,-144,8,-52,-92,-33,33,-78,-35,10,-143,42,-133,21,-52,-93,-35,31,-80,-37,-2,2,-1,3,-3,-1,-1,2,-3,-1,0,220,220,216,214,214,214,205,212,213,209,200,200,9.6790205162,10.404095052,10.276977065,9.8356521374,11.230736753,9.5477601125,8.9477759615,9.2448591671,11.456841557,11.000043651,13.07081403,10.903491614,10.026319088,12.946072044,14.101752164,13.213418013,12.819409791,13.392085709,11.804018574,12.047666856,-3.391793514,-0.499396562,0.2506579772,-3.110419907,-2.871015411,-3.6656579,-3.871633829,-4.147226542,-0.347177017,-1.047623205,0.1654533422,0.8323276041,0.9190792497,1.0928502375,0,-0.085247858,-0.172072615,-0.172801106,-0.173588508,-0.174603867,-11.99536731,2.6634483333,-12.03158291,0.6725232231,-4.390964746,-7.84280295,-2.839198142,2.8512182478,-6.769951829,-3.055567681,-11.82991396,3.4957759374,-11.11250366,1.7653734606,-4.390964746,-7.928050808,-3.011270756,2.6784171419,-6.943540338,-3.230171548 +050,2,4,19,167,Iowa,Sioux County,33704,33704,33755,34022,34289,34511,34648,34764,34955,34784,34767,34950,35043,51,267,267,222,137,116,191,-171,-17,183,93,138,510,500,525,514,504,496,487,490,494,500,53,236,255,273,252,246,266,267,254,211,263,85,274,245,252,262,258,230,220,236,283,237,24,66,48,87,82,64,58,46,22,61,49,-59,-73,-25,-115,-210,-206,-96,-440,-276,-163,-195,-35,-7,23,-28,-128,-142,-38,-394,-254,-102,-146,1,0,-1,-2,3,0,-1,3,1,2,2,2410,2410,2426,2413,2395,2385,2315,2359,2240,2202,2241,2242,15.049353025,14.638930772,15.261627907,14.864298211,14.521984671,14.22854602,13.966360286,14.090379721,14.171579385,14.287143,6.9640143411,7.465854694,7.9360465116,7.2875547651,7.0881115657,7.6306315352,7.6571215532,7.3039927535,6.0530430168,7.515037218,8.0853386842,7.1730760785,7.3255813953,7.5767434463,7.4338731055,6.5979144853,6.309238733,6.7863869678,8.1185363685,6.772105782,1.9475633327,1.4053373542,2.5290697674,2.3713471855,1.8440615456,1.6638219137,1.3192044624,0.6326292936,1.7499318674,1.400140014,-2.15412308,-0.731946539,-3.343023256,-6.072962304,-5.9355731,-2.753912133,-12.61847747,-7.936622047,-4.676047449,-5.57198577,-0.206559747,0.6733908155,-0.813953488,-3.701615119,-4.091511554,-1.090090219,-11.299273,-7.303992754,-2.926115582,-4.171845756 +050,2,4,19,169,Iowa,Story County,89542,89542,89661,91164,92046,93938,95894,96744,97012,97335,96749,97441,98237,119,1503,882,1892,1956,850,268,323,-586,692,796,258,991,902,955,955,893,882,928,837,874,826,86,493,437,477,535,504,532,558,554,551,564,172,498,465,478,420,389,350,370,283,323,262,143,931,605,915,966,722,744,762,327,719,566,-205,72,-175,485,559,-252,-832,-816,-1209,-356,-41,-62,1003,430,1400,1525,470,-88,-54,-882,363,525,9,2,-13,14,11,-9,6,7,13,6,9,8174,8175,9113,9585,10372,11393,11883,11525,11330,10497,10515,10514,10.960873773,9.8466240926,10.269700619,10.061528088,9.2712756569,9.1042341915,9.5499287357,8.6251313864,9.0014933828,8.4424411533,5.4527858427,4.7704819606,5.1294735031,5.6365628556,5.2326124648,5.4914428456,5.7423062872,5.7088683251,5.6748545239,5.7645724098,5.5080879303,5.076142132,5.1402271163,4.4249652324,4.0386631921,3.6127913458,3.8076224485,2.9162630614,3.3266388588,2.6778687435,10.297248721,6.6044429889,9.8395560908,10.177420035,7.4959249992,7.6797621751,7.8416440696,3.3696749861,7.4051186982,5.7850141559,0.7963500622,-1.910376071,5.2155024088,5.8894180117,-2.616306232,-8.588121142,-8.39735113,-12.45852311,-3.666512179,-0.419055796,11.093598783,4.6940669177,15.0550585,16.066838046,4.8796187668,-0.908358967,-0.55570706,-9.088848128,3.7386065194,5.3659583602 +050,2,4,19,171,Iowa,Tama County,17767,17767,17718,17613,17500,17432,17309,17214,17212,17040,16853,16904,16801,-49,-105,-113,-68,-123,-95,-2,-172,-187,51,-103,56,212,215,200,249,230,228,206,202,216,200,65,217,191,205,220,216,200,214,232,185,188,-9,-5,24,-5,29,14,28,-8,-30,31,12,1,4,2,1,4,12,20,1,10,40,30,-42,-103,-143,-61,-157,-120,-49,-165,-168,-19,-143,-41,-99,-141,-60,-153,-108,-29,-164,-158,21,-113,1,-1,4,-3,1,-1,-1,0,1,-1,-2,399,399,367,375,340,302,294,294,292,288,296,296,12.000792505,12.24617663,11.450818734,14.334647822,13.324450366,13.245802591,12.028494686,11.919865459,12.797345736,11.867675419,12.283830064,10.879161564,11.737089202,12.665150687,12.513396866,11.61912508,12.495620694,13.690142507,10.960689635,11.155614894,-0.283037559,1.3670150656,-0.286270468,1.6694971359,0.8110535006,1.6266775112,-0.467126007,-1.770277048,1.836656101,0.7120605251,0.2264300473,0.1139179221,0.0572540937,0.230275467,0.6951887148,1.161912508,0.0583907509,0.5900923495,2.3698788399,1.7801513129,-5.830573717,-8.145131433,-3.492499714,-9.038312081,-6.951887148,-2.846685645,-9.634473899,-9.913551471,-1.125692449,-8.485387925,-5.60414367,-8.031213511,-3.43524562,-8.808036614,-6.256698433,-1.684773137,-9.576083148,-9.323459121,1.244186391,-6.705236612 +050,2,4,19,173,Iowa,Taylor County,6317,6317,6322,6301,6259,6227,6172,6243,6219,6113,6190,6188,6092,5,-21,-42,-32,-55,71,-24,-106,77,-2,-96,23,70,68,84,74,86,78,61,81,69,65,12,88,57,96,81,74,69,93,80,63,69,11,-18,11,-12,-7,12,9,-32,1,6,-4,3,2,1,16,16,7,9,10,9,19,16,-8,-6,-53,-35,-67,53,-42,-83,68,-28,-106,-5,-4,-52,-19,-51,60,-33,-73,77,-9,-90,-1,1,-1,-1,3,-1,0,-1,-1,1,-2,96,96,90,70,62,64,56,53,56,53,52,53,11.09086588,10.828025478,13.455069678,11.936446488,13.854208619,12.518054887,9.8929614012,13.167520117,11.148812409,10.586319218,13.94280282,9.076433121,15.377222489,13.065569804,11.92106323,11.073663938,15.082711645,13.00495814,10.17935046,11.237785016,-2.851936941,1.7515923567,-1.922152811,-1.129123316,1.9331453886,1.4443909485,-5.189750243,0.1625619768,0.9694619486,-0.651465798,0.3168818823,0.1592356688,2.5628704149,2.5808532946,1.1276681434,1.4443909485,1.621796951,1.4630577908,3.0699628373,2.6058631922,-0.950645647,-8.439490446,-5.606279033,-10.80732317,8.5380587998,-6.740491093,-13.46091469,11.054214419,-4.52415576,-17.26384365,-0.633763765,-8.280254777,-3.043408618,-8.226469877,9.6657269432,-5.296100144,-11.83911774,12.51727221,-1.454192923,-14.65798046 +050,2,4,19,175,Iowa,Union County,12534,12534,12513,12555,12585,12615,12625,12431,12366,12472,12297,12224,12157,-21,42,30,30,10,-194,-65,106,-175,-73,-67,50,144,120,141,147,115,131,152,140,121,121,52,137,150,124,177,149,158,134,161,129,139,-2,7,-30,17,-30,-34,-27,18,-21,-8,-18,2,11,6,13,15,7,12,17,9,15,13,-22,25,54,2,24,-170,-50,72,-163,-81,-61,-20,36,60,15,39,-163,-38,89,-154,-66,-48,1,-1,0,-2,1,3,0,-1,0,1,-1,352,352,356,358,355,451,456,443,455,454,454,456,11.488750598,9.5465393795,11.19047619,11.648177496,9.1794380587,10.565794249,12.239310734,11.304453147,9.8690917989,9.9257618637,10.930269667,11.933174224,9.8412698413,14.025356577,11.893358876,12.743477034,10.789918673,13.000121119,10.521593736,11.40232148,0.5584809319,-2.386634845,1.3492063492,-2.377179081,-2.713920817,-2.177682784,1.4493920606,-1.695667972,-0.652501937,-1.476559616,0.8776128929,0.477326969,1.0317460317,1.1885895404,0.5587484036,0.9678590152,1.3688702794,0.7267148452,1.2234411321,1.0664041672,1.9945747567,4.2959427208,0.1587301587,1.9017432647,-13.56960409,-4.032745897,5.7975682422,-13.16161331,-6.606582113,-5.003896477,2.8721876496,4.7732696897,1.1904761905,3.0903328051,-13.01085568,-3.064886881,7.1664385216,-12.43489846,-5.383140981,-3.93749231 +050,2,4,19,177,Iowa,Van Buren County,7570,7571,7577,7512,7449,7434,7390,7297,7243,7155,7008,7044,7069,6,-65,-63,-15,-44,-93,-54,-88,-147,36,25,31,83,92,99,89,78,86,91,102,85,96,12,88,90,83,100,91,94,93,95,99,97,19,-5,2,16,-11,-13,-8,-2,7,-14,-1,0,1,0,0,0,0,0,1,0,1,0,-13,-60,-65,-30,-34,-80,-46,-86,-153,49,27,-13,-59,-65,-30,-34,-80,-46,-85,-153,50,27,0,-1,0,-1,1,0,0,-1,-1,0,-1,97,97,98,94,93,57,53,57,57,57,57,57,11.001391742,12.298643139,13.303769401,12.007555316,10.621638183,11.829436039,12.640644534,14.403728024,12.097922004,13.604478141,11.664126185,12.031281331,11.153665256,13.491635186,12.391911214,12.929848693,12.918460897,13.415236885,14.090520922,13.746191455,-0.662734442,0.2673618074,2.1501041457,-1.48407987,-1.770273031,-1.100412655,-0.277816363,0.9884911389,-1.992598918,-0.141713314,0.1325468885,0,0,0,0,0,0.1389081817,0,0.1423284942,0,-7.952813308,-8.689258739,-4.031445273,-4.587155963,-10.89398788,-6.327372765,-11.94610363,-21.60559204,6.9740962141,3.8262594771,-7.820266419,-8.689258739,-4.031445273,-4.587155963,-10.89398788,-6.327372765,-11.80719544,-21.60559204,7.1164247082,3.8262594771 +050,2,4,19,179,Iowa,Wapello County,35625,35622,35679,35484,35430,35506,35421,35450,35270,35043,35060,35151,34985,57,-195,-54,76,-85,29,-180,-227,17,91,-166,109,450,411,417,441,439,452,474,444,423,435,78,403,404,398,427,443,407,401,418,428,405,31,47,7,19,14,-4,45,73,26,-5,30,31,59,67,118,121,101,139,173,97,185,139,-1,-301,-124,-55,-217,-64,-365,-473,-106,-89,-336,30,-242,-57,63,-96,37,-226,-300,-9,96,-197,-4,0,-4,-6,-3,-4,1,0,0,0,1,867,867,848,828,827,821,878,890,854,859,912,913,12.647021626,11.591505203,11.757076802,12.435320823,12.388706241,12.78280543,13.482570791,12.667075589,12.04939397,12.404471313,11.326110479,11.394082974,11.221382655,12.040548733,12.501587391,11.510180995,11.406141112,11.925309901,12.191821794,11.548990533,1.3209111476,0.1974222297,0.5356941468,0.3947720896,-0.11288115,1.2726244344,2.0764296787,0.7417656876,-0.142427825,0.8554807802,1.6581650577,1.8896127704,3.3269425961,3.4119587745,2.850249044,3.9309954751,4.9208538962,2.7673566039,5.2698295139,3.9637276149,-8.459452243,-3.497193784,-1.550693583,-6.118967389,-1.806098404,-10.32239819,-13.45412655,-3.02412165,-2.53521528,-9.581384738,-6.801287186,-1.607581014,1.7762490132,-2.707008614,1.0441506399,-6.391402715,-8.533272652,-0.256765046,2.7346142342,-5.617657123 +050,2,4,19,181,Iowa,Warren County,46225,46226,46341,46654,46906,47369,47848,48486,49383,50087,51053,51548,52265,115,313,252,463,479,638,897,704,966,495,717,135,517,514,552,538,535,569,587,578,585,578,67,386,365,376,402,390,391,491,437,426,463,68,131,149,176,136,145,178,96,141,159,115,5,31,21,28,11,10,3,3,0,8,7,46,153,88,264,338,483,717,605,828,329,598,51,184,109,292,349,493,720,608,828,337,605,-4,-2,-6,-5,-6,0,-1,0,-3,-1,-3,1742,1742,1649,1630,1602,1564,1634,1587,1528,1489,1436,1440,11.118877359,10.987601539,11.710421639,11.300503061,11.10718957,11.627788166,11.802553534,11.429701404,11.403397628,11.135406934,8.3015215872,7.8024796922,7.9766640149,8.4438703173,8.0968297797,7.9902727115,9.8723233136,8.6414870477,8.3040126315,8.9198847928,2.8173557718,3.1851218469,3.733757624,2.8566327442,3.0103597899,3.6375154543,1.9302302202,2.7882143563,3.0993849962,2.2155221408,0.6667025109,0.4489097905,0.5940068947,0.2310511778,0.20761102,0.0613064402,0.0603196944,0,0.1559438992,0.1348578694,3.2904994892,1.8811457888,5.600636436,7.0995725553,10.027612266,14.652239218,12.1644717,16.37334388,6.4131928539,11.520715132,3.9572020001,2.3300555793,6.1946433307,7.3306237332,10.235223286,14.713545658,12.224791394,16.37334388,6.5691367531,11.655573001 +050,2,4,19,183,Iowa,Washington County,21704,21703,21687,21825,21910,21954,22040,22160,22147,22236,22095,22030,21992,-16,138,85,44,86,120,-13,89,-141,-65,-38,73,280,267,303,308,323,297,269,298,285,285,70,268,227,222,242,254,225,273,245,238,226,3,12,40,81,66,69,72,-4,53,47,59,2,4,0,8,20,13,13,11,12,44,29,-19,123,49,-45,4,41,-97,84,-206,-156,-126,-17,127,49,-37,24,54,-84,95,-194,-112,-97,-2,-1,-4,0,-4,-3,-1,-2,0,0,0,310,310,315,317,308,309,314,314,305,294,292,292,12.87001287,12.209900537,13.815429509,14.001909351,14.615384615,13.406459476,12.121758331,13.444316618,12.917847025,12.948071419,12.31844089,10.380701955,10.122195878,11.001500205,11.49321267,10.156408694,12.302007525,11.053213327,10.787535411,10.267593476,0.5515719801,1.8291985824,3.6932336312,3.0004091467,3.1221719457,3.250050782,-0.180249195,2.3911032912,2.1303116147,2.6804779428,0.1838573267,0,0.3647638154,0.9092148929,0.5882352941,0.5868147245,0.4956852849,0.5413818772,1.9943342776,1.3175230567,5.6536127965,2.2407682634,-2.051796462,0.1818429786,1.8552036199,-4.378540637,3.7852330847,-9.293722226,-7.07082153,-5.724410522,5.8374701232,2.2407682634,-1.687032646,1.0910578715,2.443438914,-3.791725912,4.2809183696,-8.752340349,-5.076487252,-4.406887465 +050,2,4,19,185,Iowa,Wayne County,6403,6403,6419,6337,6329,6384,6375,6359,6438,6488,6376,6413,6415,16,-82,-8,55,-9,-16,79,50,-112,37,2,17,85,88,100,89,84,84,101,77,94,90,11,86,110,79,76,86,82,84,91,78,92,6,-1,-22,21,13,-2,2,17,-14,16,-2,0,7,0,0,0,-1,1,0,0,0,1,11,-88,15,35,-21,-12,77,32,-99,22,4,11,-81,15,35,-21,-13,78,32,-99,22,5,-1,0,-1,-1,-1,-1,-1,1,1,-1,-1,91,91,91,93,93,94,95,94,93,93,93,93,13.327061775,13.895468183,15.731927948,13.950936594,13.193026543,13.128076893,15.627417608,11.971393035,14.700132927,14.031805426,13.483850737,17.369335228,12.428223079,11.913159339,13.507146223,12.815503634,12.997060189,14.14800995,12.197982641,14.343623324,-0.156788962,-3.473867046,3.303704869,2.0377772553,-0.31411968,0.3125732594,2.6303574192,-2.176616915,2.5021502854,-0.311817898,1.0975227344,0,0,0,-0.15705984,0.1562866297,0,0,0,0.1559089492,-13.79742866,2.3685457129,5.5061747817,-3.291794028,-1.884718078,12.034070485,4.9512610243,-15.39179104,3.4404566424,0.6236357967,-12.69990593,2.3685457129,5.5061747817,-3.291794028,-2.041777917,12.190357115,4.9512610243,-15.39179104,3.4404566424,0.7795447459 +050,2,4,19,187,Iowa,Webster County,38013,38011,37882,37754,37335,37344,37085,37089,36813,36650,36361,35982,35934,-129,-128,-419,9,-259,4,-276,-163,-289,-379,-48,112,443,454,440,421,454,446,434,454,428,429,117,444,492,464,432,452,438,452,406,435,442,-5,-1,-38,-24,-11,2,8,-18,48,-7,-13,3,43,35,52,56,71,65,36,27,67,58,-133,-169,-424,-13,-305,-67,-348,-180,-366,-439,-94,-130,-126,-389,39,-249,4,-283,-144,-339,-372,-36,6,-1,8,-6,1,-2,-1,-1,2,0,1,2627,2627,2680,2645,2754,2741,2718,2680,2720,2764,2744,2742,11.713998625,12.092317117,11.78376786,11.312794744,12.241486235,12.0700387,11.815471734,12.436482174,11.832520078,11.930585683,11.74044106,13.104449387,12.426518834,11.608378455,12.187558983,11.853535764,12.305514341,11.121611812,12.026042603,12.292118583,-0.026442435,-1.01213227,-0.642750974,-0.295583711,0.0539272521,0.2165029363,-0.490042606,1.314870362,-0.193522525,-0.361532899,1.1370246972,0.9322270905,1.3926271107,1.5047897997,1.9144174509,1.7590863576,0.980085213,0.7396145786,1.8522870216,1.6129929362,-4.468771484,-11.29326533,-0.348156778,-8.195730159,-1.806562947,-9.41787773,-4.900426065,-10.02588651,-12.1366269,-2.614160966,-3.331746787,-10.36103823,1.044470333,-6.690940359,0.1078545043,-7.658791372,-3.920340852,-9.286271932,-10.28433988,-1.001168029 +050,2,4,19,189,Iowa,Winnebago County,10866,10874,10845,10699,10608,10440,10567,10612,10599,10582,10555,10357,10277,-29,-146,-91,-168,127,45,-13,-17,-27,-198,-80,35,111,114,107,140,115,101,112,109,97,97,39,136,118,146,106,137,144,116,120,129,128,-4,-25,-4,-39,34,-22,-43,-4,-11,-32,-31,1,5,-1,3,2,9,4,9,14,5,7,-28,-125,-88,-134,91,58,27,-22,-31,-169,-56,-27,-120,-89,-131,93,67,31,-13,-17,-164,-49,2,-1,2,2,0,0,-1,0,1,-2,0,488,488,428,440,381,416,490,453,437,487,486,486,10.30449313,10.700708687,10.167236792,13.32889037,10.859813967,9.5233605205,10.575515792,10.313667976,9.2769701607,9.4019579335,12.625324916,11.07617215,13.873052071,10.091874137,12.937343595,13.577860544,10.953212785,11.354496854,12.337413925,12.406707376,-2.320831786,-0.375463463,-3.705815279,3.2370162327,-2.077529628,-4.054500024,-0.377696993,-1.040828878,-3.060443764,-3.004749443,0.4641663572,-0.093865866,0.2850627138,0.1904127196,0.8498984843,0.3771627929,0.8498182333,1.3246912996,0.4781943382,0.6784918096,-11.60415893,-8.26019618,-12.73280122,8.6637787404,5.4771235658,2.545848852,-2.077333459,-2.933245021,-16.16296863,-5.427934477,-11.13999257,-8.354062045,-12.4477385,8.85419146,6.3270220501,2.9230116449,-1.227515226,-1.608553721,-15.68477429,-4.749442667 +050,2,4,19,191,Iowa,Winneshiek County,21056,21058,21076,21055,21048,20849,20708,20756,20432,20140,20026,19992,19862,18,-21,-7,-199,-141,48,-324,-292,-114,-34,-130,47,159,180,159,174,176,168,167,193,178,187,24,177,179,196,181,190,163,194,209,163,198,23,-18,1,-37,-7,-14,5,-27,-16,15,-11,-1,10,1,3,6,12,14,14,3,18,11,0,-14,-7,-164,-141,52,-346,-281,-102,-67,-130,-1,-4,-6,-161,-135,64,-332,-267,-99,-49,-119,-4,1,-2,-1,1,-2,3,2,1,0,0,2288,2288,2291,2286,2217,2184,2266,2082,1999,1975,1918,1918,7.5478863545,8.5504595872,7.5900422465,8.3740404745,8.4892919159,8.1577158396,8.2322784186,9.6101180103,8.8959968014,9.3842525217,8.402364055,8.5029570339,9.3562784925,8.7109271603,9.1645765001,7.9149266777,9.5632455881,10.406811731,8.1463341496,9.9362673759,-0.854477701,0.0475025533,-1.766236246,-0.336886686,-0.675284584,0.2427891619,-1.330967169,-0.796693721,0.7496626518,-0.552014854,0.4747098336,0.0475025533,0.1432083443,0.2887600164,0.5788153579,0.6798096533,0.6901311249,0.1493800727,0.8995951822,0.5520148542,-0.664593767,-0.332517873,-7.82872282,-6.785860385,2.5081998842,-16.80101,-13.85191758,-5.078922472,-3.348493178,-6.523811913,-0.189883933,-0.28501532,-7.685514476,-6.497100368,3.0870152421,-16.12120035,-13.16178645,-4.929542399,-2.448897996,-5.971797059 +050,2,4,19,193,Iowa,Woodbury County,102172,102173,102393,102741,102351,102317,102333,102532,102654,102098,102415,103132,103138,220,348,-390,-34,16,199,122,-556,317,717,6,434,1502,1564,1510,1553,1545,1504,1485,1423,1417,1421,237,907,946,932,915,992,908,1018,953,967,968,197,595,618,578,638,553,596,467,470,450,453,76,217,168,220,207,161,174,178,99,244,200,-41,-463,-1195,-839,-832,-512,-646,-1205,-250,22,-651,35,-246,-1027,-619,-625,-351,-472,-1027,-151,266,-451,-12,-1,19,7,3,-3,-2,4,-2,1,4,2636,2636,2655,2546,2586,2567,2643,2557,2463,2439,2512,2513,14.644086305,15.251691924,14.755604198,15.177131688,15.083103507,14.659869582,14.505352817,13.915985781,13.787600889,13.778057885,8.8430001852,9.2251282351,9.1074325249,8.9420962619,9.6844263295,8.8505063698,9.9437368133,9.3197009481,9.4090402682,9.3857565327,5.8010861193,6.0265636885,5.6481716731,6.2350354263,5.3986771777,5.8093632119,4.5616160038,4.5962848327,4.3785606212,4.3923013526,2.1156902318,1.638289158,2.1498231282,2.0229660396,1.5717667732,1.6960221458,1.7386887552,0.9681536137,2.3741528701,1.9392058952,-4.514122476,-11.65330681,-8.198643657,-8.13095529,-4.998413589,-6.296725897,-11.7703368,-2.444832358,0.2140629637,-6.312115189,-2.398432244,-10.01501765,-6.048820529,-6.10798925,-3.426646816,-4.600703752,-10.03164804,-1.476678744,2.5882158338,-4.372909294 +050,2,4,19,195,Iowa,Worth County,7598,7591,7582,7560,7495,7488,7558,7503,7470,7456,7416,7407,7359,-9,-22,-65,-7,70,-55,-33,-14,-40,-9,-48,17,73,82,71,82,71,85,86,74,80,80,16,83,93,91,83,84,96,89,83,69,66,1,-10,-11,-20,-1,-13,-11,-3,-9,11,14,0,1,1,1,2,1,1,1,0,1,0,-10,-11,-57,11,69,-41,-23,-12,-31,-21,-62,-10,-10,-56,12,71,-40,-22,-11,-31,-20,-62,0,-2,2,1,0,-2,0,0,0,0,0,90,90,90,83,90,90,89,78,78,67,80,80,9.6420552107,10.8933909,9.4774077288,10.899906952,9.4283248124,11.35377012,11.523516012,9.9515868747,10.794036295,10.835703644,10.962884692,12.354699435,12.147100047,11.032832647,11.154637806,12.823081547,11.925499129,11.161915008,9.3098563044,8.9394555059,-1.320829481,-1.461308535,-2.669692318,-0.132925695,-1.726312994,-1.469311427,-0.401983117,-1.210328133,1.4841799906,1.8962481376,0.1320829481,0.1328462305,0.1334846159,0.2658513891,0.1327933072,0.1335737661,0.1339943722,0,0.1349254537,0,-1.452912429,-7.572235138,1.4683307749,9.171872923,-5.444525596,-3.072196621,-1.607932467,-4.168908015,-2.833434527,-8.397670324,-1.320829481,-7.439388907,1.6018153908,9.4377243121,-5.311732289,-2.938622854,-1.473938095,-4.168908015,-2.698509074,-8.397670324 +050,2,4,19,197,Iowa,Wright County,13229,13229,13185,13032,13019,12982,12905,12843,12825,12758,12669,12551,12416,-44,-153,-13,-37,-77,-62,-18,-67,-89,-118,-135,44,139,157,128,156,160,150,169,148,157,158,62,167,146,152,163,161,152,182,180,168,174,-18,-28,11,-24,-7,-1,-2,-13,-32,-11,-16,7,7,4,9,16,14,21,13,11,29,23,-33,-133,-26,-19,-87,-76,-38,-67,-67,-137,-140,-26,-126,-22,-10,-71,-62,-17,-54,-56,-108,-117,0,1,-2,-3,1,1,1,0,-1,1,-2,198,198,194,195,193,200,216,206,206,199,205,205,10.60380669,12.053280104,9.8457751625,12.052381504,12.428149759,11.687704535,13.211898526,11.641168836,12.450436162,12.656706853,12.739825304,11.208782772,11.691858005,12.593193495,12.505825695,11.843540595,14.228198413,14.158178314,13.322759715,13.938398686,-2.136018614,0.8444973322,-1.846082843,-0.540811991,-0.077675936,-0.15583606,-1.016299887,-2.517009478,-0.872323553,-1.281691833,0.5340046535,0.307089939,0.6922810661,1.2361416927,1.0874631039,1.6362786349,1.0162998866,0.8652220081,2.2997620936,1.8424320103,-10.14608842,-1.996084603,-1.461482251,-6.721520454,-5.903371136,-2.960885149,-5.237853262,-5.269988595,-10.86439334,-11.21480354,-9.612083762,-1.688994664,-0.769201185,-5.485378762,-4.815908032,-1.324606514,-4.221553375,-4.404766587,-8.564631245,-9.37237153 +040,2,4,20,000,Kansas,Kansas,2853118,2853120,2858266,2869677,2886024,2894306,2901861,2910717,2912977,2910892,2912748,2912635,2913805,5146,11411,16347,8282,7555,8856,2260,-2085,1856,-113,1170,9994,40118,39553,39703,39285,39003,38769,37219,36459,35805,35467,5995,25171,24977,25595,25474,26527,26238,27012,27688,25737,27169,3999,14947,14576,14108,13811,12476,12531,10207,8771,10068,8298,998,5133,6323,6080,6873,9413,7913,2531,4307,3016,2483,209,-8667,-4628,-11912,-13108,-12934,-18179,-14784,-11194,-13226,-9663,1207,-3534,1695,-5832,-6235,-3521,-10266,-12253,-6887,-10210,-7180,-60,-2,76,6,-21,-99,-5,-39,-28,29,52,79090,79102,79155,80423,80436,80623,80306,80141,79575,80556,79132,79138,14.007820958,13.743938401,13.737277975,13.555510047,13.420207006,13.314229766,12.781537497,12.521034954,12.29275397,12.174501068,8.7888444421,8.6790470874,8.8558957707,8.7899468735,9.127447408,9.0107756348,9.2763075543,9.5088295293,8.8361572106,9.3261065076,5.2189765157,5.0648913138,4.8813822048,4.765563173,4.2927595982,4.3034541307,3.5052299425,3.0122054248,3.4565967594,2.84839456,1.7922664384,2.1971259452,2.1036861217,2.3715672789,3.2388382573,2.7175191554,0.8691816385,1.4791436284,1.0354683975,0.8523214862,-3.026217265,-1.60814469,-4.121563994,-4.522989072,-4.450348881,-6.243116482,-5.077037275,-3.844331037,-4.540817316,-3.316948257,-1.233950827,0.5889812553,-2.017877872,-2.151421793,-1.211510624,-3.525597327,-4.207855637,-2.365187409,-3.505348919,-2.46462677 +050,2,4,20,001,Kansas,Allen County,13371,13372,13363,13348,13304,13065,12889,12680,12667,12545,12500,12404,12399,-9,-15,-44,-239,-176,-209,-13,-122,-45,-96,-5,31,152,155,134,158,134,146,147,147,156,157,26,185,191,197,188,182,161,160,160,155,166,5,-33,-36,-63,-30,-48,-15,-13,-13,1,-9,0,5,5,8,2,23,11,1,1,0,1,-14,13,-10,-188,-153,-184,-8,-110,-33,-95,3,-14,18,-5,-180,-151,-161,3,-109,-32,-95,4,0,0,-3,4,5,0,-1,0,0,-2,0,382,382,382,382,382,382,382,382,382,382,382,382,11.381078956,11.631397268,10.163449505,12.175387224,10.481442372,11.520100998,11.661113755,11.738870034,12.528107934,12.6597589,13.851971098,14.332883086,14.941787705,14.487169608,14.235988893,12.703673019,12.692368713,12.777001397,12.44779955,13.385477563,-2.470892142,-2.701485817,-4.7783382,-2.311782384,-3.754546521,-1.18357202,-1.031254958,-1.038131364,0.0803083842,-0.725718663,0.3743775972,0.3752063635,0.6067731048,0.1541188256,1.7990535414,0.8679528149,0.0793273045,0.0798562587,0,0.080635407,0.9733817528,-0.750412727,-14.25916796,-11.79009016,-14.39242833,-0.631238411,-8.72600349,-2.635256538,-7.629296499,0.241906221,1.3477593501,-0.375206363,-13.65239486,-11.63597133,-12.59337479,0.2367144041,-8.646676186,-2.555400279,-7.629296499,0.322541628 +050,2,4,20,003,Kansas,Anderson County,8102,8104,8105,8066,7925,7859,7888,7826,7828,7850,7858,7899,7949,1,-39,-141,-66,29,-62,2,22,8,41,50,25,100,98,92,99,88,99,105,107,105,102,14,96,117,86,85,85,102,122,109,93,106,11,4,-19,6,14,3,-3,-17,-2,12,-4,0,-1,-2,-3,-2,0,0,0,0,0,0,-10,-41,-124,-68,18,-65,5,41,10,29,55,-10,-42,-126,-71,16,-65,5,41,10,29,55,0,-1,4,-1,-1,0,0,-2,0,0,-1,103,103,103,103,103,103,103,103,103,103,103,103,12.367818935,12.256894503,11.657374557,12.573823585,11.20020364,12.648524339,13.394565633,13.623631271,13.32741004,12.872286724,11.873106178,14.633231193,10.897110998,10.795707119,10.818378516,13.031812955,15.563209593,13.878278584,11.804277464,13.377082282,0.4947127574,-2.376336689,0.760263558,1.7781164666,0.3818251241,-0.383288616,-2.16864396,-0.254647313,1.523132576,-0.504795558,-0.123678189,-0.250140704,-0.380131779,-0.254016638,0,0,0,0,0,0,-5.070805763,-15.50872366,-8.616320324,2.2861497428,-8.272877689,0.6388143605,5.2302589616,1.2732365674,3.6809037253,6.9409389197,-5.194483953,-15.75886436,-8.996452103,2.0321331047,-8.272877689,0.6388143605,5.2302589616,1.2732365674,3.6809037253,6.9409389197 +050,2,4,20,005,Kansas,Atchison County,16924,16921,16855,16756,16779,16697,16534,16429,16376,16319,16202,16138,16015,-66,-99,23,-82,-163,-105,-53,-57,-117,-64,-123,52,215,206,198,218,198,187,200,191,172,180,70,186,176,167,165,190,198,179,181,165,178,-18,29,30,31,53,8,-11,21,10,7,2,0,0,2,0,3,2,5,1,3,0,-3,-51,-128,-5,-115,-223,-114,-47,-80,-131,-71,-123,-51,-128,-3,-115,-220,-112,-42,-79,-128,-71,-126,3,0,-4,2,4,-1,0,1,1,0,1,1375,1375,1375,1375,1375,1377,1379,1382,1384,1385,1386,1386,12.793430722,12.285671686,11.829370295,13.120279257,12.013469648,11.400701113,12.234286588,11.746256265,10.636982066,11.196466893,11.067805183,10.496496198,9.9772971681,9.9304865938,11.528076935,12.07133059,10.949686496,11.131269026,10.204081633,11.072061705,1.7256255393,1.7891754883,1.852073127,3.1897926635,0.485392713,-0.670629477,1.2846000918,0.614987239,0.4329004329,0.1244051877,0,0.1192783659,0,0.1805543017,0.1213481783,0.3048315806,0.0611714329,0.1844961717,0,-0.186607782,-7.616554104,-0.298195915,-6.870593858,-13.42120309,-6.916846161,-2.865416857,-4.893714635,-8.056332831,-4.390847248,-7.650919043,-7.616554104,-0.178917549,-6.870593858,-13.24064879,-6.795497983,-2.560585277,-4.832543202,-7.871836659,-4.390847248,-7.837526825 +050,2,4,20,007,Kansas,Barber County,4861,4864,4852,4922,4867,4909,4881,4824,4672,4569,4462,4458,4358,-12,70,-55,42,-28,-57,-152,-103,-107,-4,-100,13,79,57,64,69,54,57,60,47,59,51,5,57,54,72,58,70,61,63,64,47,51,8,22,3,-8,11,-16,-4,-3,-17,12,0,0,0,1,1,0,0,1,0,2,4,3,-20,48,-57,46,-37,-44,-149,-101,-91,-21,-102,-20,48,-56,47,-37,-44,-148,-101,-89,-17,-99,0,0,-2,3,-2,3,0,1,-1,1,-1,40,40,40,40,40,40,40,40,40,40,40,40,16.165336607,11.645724793,13.093289689,14.096016343,11.128284389,12.00505476,12.985607618,10.408592625,13.228699552,11.569872958,11.663597299,11.032791909,14.7299509,11.848825332,14.425553838,12.847514743,13.634887999,14.173402724,10.538116592,11.569872958,4.5017393084,0.6129328838,-1.636661211,2.2471910112,-3.297269449,-0.842459983,-0.649280381,-3.764810099,2.6905829596,0,0,0.2043109613,0.2045826514,0,0,0.2106149958,0,0.4429188351,0.8968609865,0.6805807623,9.8219766728,-11.64572479,9.410801964,-7.558733401,-9.067490984,-31.38163437,-21.85910616,-20.152807,-4.708520179,-23.13974592,9.8219766728,-11.44141383,9.6153846154,-7.558733401,-9.067490984,-31.17101938,-21.85910616,-19.70988816,-3.811659193,-22.45916515 +050,2,4,20,009,Kansas,Barton County,27674,27672,27675,27700,27522,27447,27339,27164,26904,26427,26120,25938,25658,3,25,-178,-75,-108,-175,-260,-477,-307,-182,-280,82,388,369,372,371,332,357,304,308,312,309,72,328,310,278,283,303,289,290,318,288,317,10,60,59,94,88,29,68,14,-10,24,-8,6,-17,-17,10,33,11,24,6,28,32,27,-10,-17,-220,-179,-229,-214,-353,-498,-326,-237,-299,-4,-34,-237,-169,-196,-203,-329,-492,-298,-205,-272,-3,-1,0,0,0,-1,1,1,1,-1,0,672,672,672,672,672,672,672,672,672,672,672,672,14.013544018,13.36423889,13.53490149,13.543606031,12.182815625,13.205592957,11.400498772,11.722838602,11.986630297,11.977672688,11.846501129,11.227409366,10.114791974,10.331106487,11.118654019,10.690241918,10.875475802,12.103450245,11.064581813,12.287774246,2.1670428894,2.1368295245,3.4201095163,3.2124995437,1.0641616058,2.5153510394,0.5250229698,-0.380611643,0.9220484844,-0.310101558,-0.613995485,-0.615696643,0.3638414379,1.2046873289,0.4036475056,0.8877709551,0.2250098442,1.0657126001,1.2293979792,1.0465927591,-0.613995485,-7.967838905,-6.512761738,-8.359799949,-7.852778746,-13.05763113,-18.67581707,-12.40793956,-9.105228783,-11.59004574,-1.227990971,-8.583535547,-6.148920301,-7.15511262,-7.44913124,-12.16986018,-18.45080722,-11.34222696,-7.875830804,-10.54345298 +050,2,4,20,011,Kansas,Bourbon County,15173,15173,15137,14945,14877,14835,14798,14734,14619,14604,14538,14499,14435,-36,-192,-68,-42,-37,-64,-115,-15,-66,-39,-64,44,216,196,206,230,209,204,189,197,194,195,66,183,181,180,199,201,196,202,196,178,160,-22,33,15,26,31,8,8,-13,1,16,35,0,12,16,21,28,24,16,5,8,5,3,-14,-237,-100,-89,-98,-96,-136,-6,-77,-58,-102,-14,-225,-84,-68,-70,-72,-120,-1,-69,-53,-99,0,0,1,0,2,0,-3,-1,2,-2,0,409,409,409,409,409,409,409,409,409,409,409,409,14.360747291,13.144658306,13.866451265,15.523234232,14.154137884,13.899771744,12.935016939,13.52000549,13.362261942,13.478952098,12.166744232,12.138689558,12.11631664,13.430972227,13.612352702,13.354682656,13.824727099,13.451376021,12.26021972,11.059653003,2.1940030583,1.0059687479,1.7501346257,2.0922620052,0.5417851822,0.545089088,-0.88971016,0.0686294695,1.102042222,2.4192990945,0.7978192939,1.0730333311,1.4135702746,1.889785037,1.6253555465,1.090178176,0.3421962153,0.549035756,0.3443881944,0.2073684938,-15.75693106,-6.706458319,-5.99084545,-6.614247629,-6.501422186,-9.266514496,-0.410635458,-5.284469151,-3.994903055,-7.05052879,-14.95911176,-5.633424988,-4.577275175,-4.724462592,-4.87606664,-8.17633632,-0.068439243,-4.735433395,-3.65051486,-6.843160296 +050,2,4,20,013,Kansas,Brown County,9984,9984,9967,9973,9869,9916,9789,9710,9639,9619,9592,9541,9482,-17,6,-104,47,-127,-79,-71,-20,-27,-51,-59,29,138,152,139,140,115,117,127,122,141,134,42,122,131,123,135,116,94,140,153,135,128,-13,16,21,16,5,-1,23,-13,-31,6,6,0,0,2,3,2,3,3,3,4,3,4,-5,-9,-129,29,-135,-80,-98,-9,0,-60,-69,-5,-9,-127,32,-133,-77,-95,-6,4,-57,-65,1,-1,2,-1,1,-1,1,-1,0,0,0,116,116,116,116,116,116,116,116,116,116,116,116,13.841524574,15.321036186,14.051048774,14.209591474,11.795476691,12.093648251,13.189323917,12.701056686,14.738932734,14.08820901,12.23671013,13.204314081,12.433661865,13.702106064,11.898046054,9.7162644064,14.539412192,15.928374369,14.111744107,13.457393681,1.6048144433,2.1167221046,1.6173869093,0.5074854098,-0.102569363,2.3773838441,-1.350088275,-3.227317683,0.627188627,0.6308153288,0,0.2015925814,0.3032600455,0.2029941639,0.3077080876,0.3100935449,0.3115588327,0.4164280881,0.3135943135,0.4205435525,-0.902708124,-13.0027215,2.9315137731,-13.70210606,-8.205549003,-10.12972247,-0.934676498,0,-6.27188627,-7.254376281,-0.902708124,-12.80112892,3.2347738185,-13.4991119,-7.897840915,-9.819628921,-0.623117665,0.4164280881,-5.958291956,-6.833832729 +050,2,4,20,015,Kansas,Butler County,65880,65884,65901,65854,65692,65706,65900,66293,66723,66916,66887,66932,66992,17,-47,-162,14,194,393,430,193,-29,45,60,198,782,756,754,744,754,762,743,764,681,690,181,603,616,634,611,620,638,650,667,644,693,17,179,140,120,133,134,124,93,97,37,-3,3,62,42,51,21,43,53,19,36,25,17,2,-291,-357,-162,51,220,256,83,-162,-17,46,5,-229,-315,-111,72,263,309,102,-126,8,63,-5,3,13,5,-11,-4,-3,-2,0,0,0,2309,2309,2309,2309,2309,2307,2304,2302,2300,2299,2298,2298,11.870517248,11.494078117,11.476582596,11.306475389,11.407563184,11.457268299,11.119508527,11.419773847,10.177926901,10.304351722,9.1533528139,9.3655451325,9.6500707773,9.2852909442,9.3802243689,9.5928309376,9.7276992495,9.9698810938,9.6249411519,10.349153251,2.717164434,2.1285329847,1.8265118191,2.0211844445,2.0273388152,1.8644373609,1.3918092772,1.4498927528,0.5529857494,-0.044801529,0.9411407537,0.6385598954,0.7762675231,0.319134386,0.6505639482,0.7968966139,0.2843481319,0.5381045268,0.3736390199,0.2538753323,-4.417289666,-5.427759111,-2.465790956,0.7750406516,3.3284667116,3.8491610032,1.2421523657,-2.421470371,-0.254074534,0.6869567815,-3.476148913,-4.789199215,-1.689523433,1.0941750376,3.9790306597,4.6460576171,1.5265004976,-1.883365844,0.1195644864,0.9408321137 +050,2,4,20,017,Kansas,Chase County,2790,2790,2784,2768,2741,2688,2652,2654,2631,2652,2565,2585,2586,-6,-16,-27,-53,-36,2,-23,21,-87,20,1,8,17,25,26,27,30,28,28,16,25,25,17,41,35,31,36,33,38,34,45,22,18,-9,-24,-10,-5,-9,-3,-10,-6,-29,3,7,0,0,0,0,0,0,1,1,2,1,2,3,9,-17,-49,-26,4,-12,25,-60,16,-7,3,9,-17,-49,-26,4,-11,26,-58,17,-5,0,-1,0,1,-1,1,-2,1,0,0,-1,145,145,145,145,145,145,145,145,145,145,145,145,6.1239193084,9.0760573607,9.5781911954,10.112359551,11.30795326,10.59602649,10.600037857,6.1337933678,9.7087378641,9.6693096113,14.76945245,12.706480305,11.420151041,13.483146067,12.438748587,14.380321665,12.871474541,17.251293847,8.5436893204,6.9619029201,-8.645533141,-3.630422944,-1.841959845,-3.370786517,-1.130795326,-3.784295175,-2.271436684,-11.11750048,1.1650485437,2.7074066912,0,0,0,0,0,0.3784295175,0.3785727806,0.766724171,0.3883495146,0.7735447689,3.242074928,-6.171719005,-18.05120648,-9.737827715,1.5077271014,-4.54115421,9.4643195154,-23.00172513,6.213592233,-2.707406691,3.242074928,-6.171719005,-18.05120648,-9.737827715,1.5077271014,-4.162724693,9.842892296,-22.23500096,6.6019417476,-1.933861922 +050,2,4,20,019,Kansas,Chautauqua County,3669,3669,3649,3612,3562,3532,3460,3389,3361,3320,3287,3203,3230,-20,-37,-50,-30,-72,-71,-28,-41,-33,-84,27,4,36,33,42,36,37,33,28,32,34,33,23,56,61,47,60,53,62,49,50,47,51,-19,-20,-28,-5,-24,-16,-29,-21,-18,-13,-18,0,0,1,0,0,0,0,0,0,0,0,0,-17,-23,-26,-49,-55,1,-20,-14,-72,46,0,-17,-22,-26,-49,-55,1,-20,-14,-72,46,-1,0,0,1,1,0,0,0,-1,1,-1,79,79,79,79,79,79,79,79,79,79,79,79,9.9159895331,9.1998884862,11.840992388,10.297482838,10.804497007,9.7777777778,8.3819787457,9.6866959286,10.477657935,10.259598943,15.424872607,17.005854474,13.250634339,17.162471396,15.476711929,18.37037037,14.668462805,15.135462388,14.483821263,15.855743821,-5.508883074,-7.805965988,-1.409641951,-6.864988558,-4.672214922,-8.592592593,-6.286484059,-5.44876646,-4.006163328,-5.596144878,0,0.2787844996,0,0,0,0,0,0,0,0,-4.682550613,-6.41204349,-7.330138145,-14.01601831,-16.06073879,0.2962962963,-5.987127675,-4.237929469,-22.18798151,14.301259133,-4.682550613,-6.133258991,-7.330138145,-14.01601831,-16.06073879,0.2962962963,-5.987127675,-4.237929469,-22.18798151,14.301259133 +050,2,4,20,021,Kansas,Cherokee County,21603,21610,21529,21368,21206,20915,20785,20552,20280,20151,20024,19948,19681,-81,-161,-162,-291,-130,-233,-272,-129,-127,-76,-267,48,243,265,204,241,239,243,191,227,242,230,94,274,274,261,255,268,232,255,323,251,281,-46,-31,-9,-57,-14,-29,11,-64,-96,-9,-51,-1,-1,0,-4,-3,0,14,8,11,8,6,-32,-129,-155,-233,-115,-206,-297,-72,-42,-76,-220,-33,-130,-155,-237,-118,-206,-283,-64,-31,-68,-214,-2,0,2,3,2,2,0,-1,0,1,-2,202,202,202,202,202,202,202,202,202,202,202,202,11.329463599,12.448912482,9.6863797156,11.558752998,11.563490336,11.902429467,9.4481956914,11.30056005,12.108475933,11.607661056,12.774786116,12.871705736,12.392868166,12.230215827,12.966591673,11.363636364,12.614083253,16.079651525,12.558791154,14.181533725,-1.445322517,-0.422793254,-2.70648845,-0.67146283,-1.403101338,0.5387931034,-3.165887562,-4.779091475,-0.450315221,-2.573872669,-0.046623307,0,-0.189929014,-0.143884892,0,0.6857366771,0.3957359452,0.5476042315,0.4002801961,0.3028085493,-6.014406602,-7.281439376,-11.06336507,-5.51558753,-9.966857779,-14.54741379,-3.561623507,-2.09085252,-3.802661863,-11.10298014,-6.061029909,-7.281439376,-11.25329408,-5.659472422,-9.966857779,-13.86167712,-3.165887562,-1.543248289,-3.402381667,-10.80017159 +050,2,4,20,023,Kansas,Cheyenne County,2726,2726,2715,2693,2668,2672,2687,2676,2665,2682,2625,2624,2600,-11,-22,-25,4,15,-11,-11,17,-57,-1,-24,6,28,32,23,28,43,35,35,26,21,22,15,39,45,41,21,40,41,25,43,32,49,-9,-11,-13,-18,7,3,-6,10,-17,-11,-27,0,1,4,5,4,3,1,-2,-1,-2,-1,-2,-12,-15,16,5,-18,-5,10,-39,11,5,-2,-11,-11,21,9,-15,-4,8,-40,9,4,0,0,-1,1,-1,1,-1,-1,0,1,-1,49,49,49,49,49,49,49,49,49,49,49,49,10.355029586,11.938071255,8.6142322097,10.449710767,16.035800858,13.106159895,13.091453151,9.7983794988,8.0015240998,8.4226646248,14.423076923,16.787912703,15.355805243,7.8372830752,14.917024054,15.352930163,9.3510379652,16.205012248,12.192798628,18.75957121,-4.068047337,-4.849841447,-6.741573034,2.6124276917,1.118776804,-2.246770268,3.7404151861,-6.406632749,-4.191274528,-10.33690658,0.3698224852,1.4922589069,1.872659176,1.4928158238,1.118776804,0.3744617113,-0.748083037,-0.37686075,-0.762049914,-0.382848392,-4.437869822,-5.595970901,5.9925093633,1.8660197798,-6.712660824,-1.872308556,3.7404151861,-14.69756925,4.1912745285,1.9142419602,-4.068047337,-4.103711994,7.8651685393,3.3588356037,-5.59388402,-1.497846845,2.9923321489,-15.07443,3.4292246142,1.5313935681 +050,2,4,20,025,Kansas,Clark County,2215,2215,2199,2121,2166,2179,2115,2082,2068,1996,1995,2006,1963,-16,-78,45,13,-64,-33,-14,-72,-1,11,-43,8,26,24,29,18,21,27,20,22,25,24,12,37,37,24,34,40,30,33,28,25,20,-4,-11,-13,5,-16,-19,-3,-13,-6,0,4,0,1,0,-1,0,0,1,1,1,1,0,-12,-68,56,10,-50,-13,-12,-61,4,10,-46,-12,-67,56,9,-50,-13,-11,-60,5,11,-46,0,0,2,-1,2,-1,0,1,0,0,-1,57,57,57,57,57,57,57,57,57,57,57,57,12.037037037,11.196641008,13.34867664,8.3837913367,10.007147963,13.012048193,9.842519685,11.024805813,12.496875781,12.093726379,17.12962963,17.26148822,11.047180667,15.836050303,19.061234215,14.457831325,16.24015748,14.031571035,12.496875781,10.078105316,-5.092592593,-6.064847213,2.3014959724,-7.452258966,-9.054086252,-1.445783133,-6.397637795,-3.006765222,0,2.0156210632,0.462962963,0,-0.460299194,0,0,0.4819277108,0.4921259843,0.501127537,0.4998750312,0,-31.48148148,26.125495685,4.6029919448,-23.28830927,-6.19490112,-5.78313253,-30.01968504,2.0045101478,4.9987503124,-23.17964223,-31.01851852,26.125495685,4.1426927503,-23.28830927,-6.19490112,-5.301204819,-29.52755906,2.5056376848,5.4986253437,-23.17964223 +050,2,4,20,027,Kansas,Clay County,8535,8542,8544,8526,8499,8384,8298,8291,8106,8003,8008,8009,8025,2,-18,-27,-115,-86,-7,-185,-103,5,1,16,20,99,104,115,105,107,106,88,109,78,88,34,111,103,98,113,103,112,97,93,100,109,-14,-12,1,17,-8,4,-6,-9,16,-22,-21,0,-1,-1,-1,1,2,4,-2,0,-2,1,17,-4,-24,-133,-82,-11,-185,-92,-10,24,37,17,-5,-25,-134,-81,-9,-181,-94,-10,22,38,-1,-1,-3,2,3,-2,2,0,-1,1,-1,140,140,140,140,140,140,140,140,140,140,140,140,11.599297012,12.21732746,13.623171237,12.588418655,12.900114534,12.929194365,10.925569557,13.615639248,9.7396516202,10.976674567,13.005272408,12.099853157,11.609311141,13.547536267,12.417867261,13.661035555,12.042957353,11.617013303,12.486732846,13.59610827,-1.405975395,0.1174743025,2.013860096,-0.959117612,0.4822472723,-0.73184119,-1.117387796,1.9986259447,-2.747081226,-2.619433703,-0.117164616,-0.117474302,-0.118462359,0.1198897015,0.2411236361,0.487894127,-0.248308399,0,-0.249734657,0.1247349383,-0.468658465,-2.81938326,-15.75549369,-9.830955521,-1.326179999,-22.56510337,-11.42218636,-1.249141215,2.9968158831,4.6151927155,-0.585823081,-2.936857562,-15.87395605,-9.711065819,-1.085056363,-22.07720925,-11.67049475,-1.249141215,2.7470812262,4.7399276537 +050,2,4,20,029,Kansas,Cloud County,9533,9533,9518,9420,9416,9355,9332,9192,9088,8922,8725,8779,8642,-15,-98,-4,-61,-23,-140,-104,-166,-197,54,-137,23,129,118,125,94,113,122,98,97,104,104,47,131,131,124,121,159,136,159,133,133,133,-24,-2,-13,1,-27,-46,-14,-61,-36,-29,-29,1,21,18,11,13,12,8,5,6,5,5,8,-117,-11,-71,-7,-107,-98,-110,-168,79,-112,9,-96,7,-60,6,-95,-90,-105,-162,84,-107,0,0,2,-2,-2,1,0,0,1,-1,-1,498,498,498,498,498,498,498,498,498,498,498,498,13.623402682,12.529199405,13.318416707,10.060469845,12.200388685,13.347921225,10.882842865,10.993369978,11.882998172,11.939613111,13.834618228,13.909534933,13.211869373,12.950179269,17.166918592,14.879649891,17.656857301,15.073383578,15.196526508,15.268928305,-0.211215545,-1.380335528,0.1065473337,-2.889709424,-4.966529907,-1.531728665,-6.774014436,-4.0800136,-3.313528336,-3.329315194,2.2177632274,1.9112338076,1.1720206702,1.3913415744,1.2956164975,0.875273523,0.555247085,0.6800022667,0.571297989,0.5740198611,-12.35610941,-1.167976216,-7.564860689,-0.749183925,-11.55258044,-10.72210066,-12.21543587,-19.04006347,9.0265082267,-12.85804489,-10.13834618,0.7432575918,-6.392840019,0.6421576497,-10.25696394,-9.846827133,-11.66018878,-18.3600612,9.5978062157,-12.28402503 +050,2,4,20,031,Kansas,Coffey County,8601,8598,8585,8489,8470,8381,8398,8294,8346,8231,8212,8142,8158,-13,-96,-19,-89,17,-104,52,-115,-19,-70,16,24,89,86,91,91,77,90,83,89,70,69,45,105,96,116,84,101,107,76,110,78,88,-21,-16,-10,-25,7,-24,-17,7,-21,-8,-19,0,1,2,3,-1,3,2,0,0,-1,0,9,-82,-9,-68,11,-82,67,-121,2,-61,35,9,-81,-7,-65,10,-79,69,-121,2,-62,35,-1,1,-2,1,0,-1,0,-1,0,0,0,130,130,130,130,130,130,130,130,130,130,130,130,10.425207918,10.142107436,10.800545962,10.846891948,9.2259765157,10.817307692,10.013874646,10.825275193,8.5605967959,8.4662576687,12.2994026,11.321422254,13.767728918,10.012515645,12.10160556,12.860576923,9.1693310008,13.379553609,9.5389507154,10.797546012,-1.874194682,-1.179314818,-2.967182957,0.8343763037,-2.875629044,-2.043269231,0.8445436448,-2.554278416,-0.97835392,-2.331288344,0.1171371676,0.2358629636,0.3560619548,-0.119196615,0.3594536305,0.2403846154,0,0,-0.12229424,0,-9.605247745,-1.061383336,-8.070737642,1.311162763,-9.8250659,8.0528846154,-14.59854015,0.2432646111,-7.459948636,4.2944785276,-9.488110577,-0.825520373,-7.714675687,1.1919661482,-9.465612269,8.2932692308,-14.59854015,0.2432646111,-7.582242876,4.2944785276 +050,2,4,20,033,Kansas,Comanche County,1891,1891,1886,1884,1916,1928,1950,1828,1844,1763,1740,1704,1690,-5,-2,32,12,22,-122,16,-81,-23,-36,-14,6,28,28,20,21,22,21,13,17,12,14,15,34,31,31,30,38,33,29,31,18,15,-9,-6,-3,-11,-9,-16,-12,-16,-14,-6,-1,0,0,0,0,0,-1,0,0,0,0,0,4,4,34,24,32,-107,27,-66,-7,-30,-14,4,4,34,24,32,-108,27,-66,-7,-30,-14,0,0,1,-1,-1,2,1,1,-2,0,1,65,65,65,65,65,65,65,65,65,65,65,65,14.854111406,14.736842105,10.405827263,10.83032491,11.646373743,11.437908497,7.2082062656,9.7059663146,6.968641115,8.2498526812,18.037135279,16.315789474,16.129032258,15.471892728,20.116463737,17.973856209,16.079844746,17.699115044,10.452961672,8.8391278727,-3.183023873,-1.578947368,-5.723204995,-4.641567818,-8.470089995,-6.535947712,-8.871638481,-7.99314873,-3.484320557,-0.589275192,0,0,0,0,-0.529380625,0,0,0,0,0,2.1220159151,17.894736842,12.486992716,16.503352243,-56.64372684,14.705882353,-36.59550873,-3.996574365,-17.42160279,-8.249852681,2.1220159151,17.894736842,12.486992716,16.503352243,-57.17310746,14.705882353,-36.59550873,-3.996574365,-17.42160279,-8.249852681 +050,2,4,20,035,Kansas,Cowley County,36311,36309,36314,36259,36281,36186,35918,35774,35662,35311,35067,34784,34628,5,-55,22,-95,-268,-144,-112,-351,-244,-283,-156,118,480,452,440,479,459,413,422,378,387,372,67,452,439,429,417,449,449,434,431,422,447,51,28,13,11,62,10,-36,-12,-53,-35,-75,12,51,41,49,75,61,33,0,12,6,7,-59,-133,-29,-152,-415,-212,-109,-341,-202,-256,-88,-47,-82,12,-103,-340,-151,-76,-341,-190,-250,-81,1,-1,-3,-3,10,-3,0,2,-1,2,0,2004,2004,2004,2004,2004,2004,2005,2006,2009,2010,2013,2014,13.228060022,12.462089881,12.143458402,13.286364141,12.804775986,11.562797469,11.891846195,10.741993237,11.08072898,10.718607734,12.456423188,12.103666942,11.839871942,11.566625985,12.525804832,12.570692648,12.230002959,12.248145727,12.082862092,12.879617357,0.7716368346,0.3584229391,0.30358646,1.719738156,0.2789711544,-1.007895179,-0.338156764,-1.506152491,-1.002133112,-2.161009624,1.4054813774,1.1304108078,1.3523396857,2.0803284145,1.7017240417,0.923903914,0,0.3410156583,0.1717942478,0.2016942315,-3.665274965,-0.799558864,-4.195012902,-11.51115056,-5.914188473,-3.051682625,-9.609288039,-5.740430248,-7.329887904,-2.535584625,-2.259793587,0.3308519438,-2.842673217,-9.430822146,-4.212464431,-2.127778711,-9.609288039,-5.39941459,-7.158093656,-2.333890394 +050,2,4,20,037,Kansas,Crawford County,39134,39135,39173,39210,39333,39264,39291,39166,39082,38942,38884,38734,38730,38,37,123,-69,27,-125,-84,-140,-58,-150,-4,120,482,498,456,530,516,492,476,458,441,434,78,445,435,379,409,439,428,460,432,384,380,42,37,63,77,121,77,64,16,26,57,54,15,113,84,112,151,165,134,46,74,54,41,-15,-112,-14,-260,-246,-368,-283,-201,-159,-262,-100,0,1,70,-148,-95,-203,-149,-155,-85,-208,-59,-4,-1,-10,2,1,1,1,-1,1,1,1,1773,1773,1773,1773,1773,1774,1776,1777,1781,1781,1780,1780,12.298585152,12.680951835,11.603496317,13.493730507,13.153702028,12.575401288,12.201373936,11.769845553,11.363343554,11.205204998,11.35450289,11.076735037,9.644134,10.413086373,11.190843392,10.93957673,11.79124372,11.101688382,9.8946120745,9.8110089848,0.9440822627,1.6042167984,1.9593623166,3.0806441347,1.9628586359,1.6358245578,0.4101302163,0.6681571711,1.4687314798,1.3941960136,2.8832782619,2.1389557313,2.8499815515,3.8444402011,4.2061256484,3.4250076679,1.179124372,1.9016781024,1.391429823,1.0585562326,-2.857762525,-0.356492622,-6.616028602,-6.263127745,-9.38093478,-7.233411717,-5.152260843,-4.086038085,-6.751011363,-2.58184447,0.0255157368,1.7824631094,-3.76604705,-2.418687544,-5.174809131,-3.808404049,-3.973136471,-2.184359983,-5.35958154,-1.523288237 +050,2,4,20,039,Kansas,Decatur County,2961,2965,2957,2927,2886,2911,2900,2927,2829,2866,2842,2816,2776,-8,-30,-41,25,-11,27,-98,37,-24,-26,-40,4,31,29,44,32,36,27,35,28,30,29,4,65,58,47,38,38,49,52,44,38,40,0,-34,-29,-3,-6,-2,-22,-17,-16,-8,-11,0,0,0,1,3,3,8,2,5,7,6,-8,4,-12,28,-8,26,-85,51,-12,-25,-35,-8,4,-12,29,-5,29,-77,53,-7,-18,-29,0,0,0,-1,0,0,1,1,-1,0,0,81,81,81,81,81,81,81,81,81,81,81,81,10.537049626,9.9776363324,15.180265655,11.013594906,12.356272524,9.3815149409,12.291483758,9.8107918711,10.604453871,10.371959943,22.093813732,19.955272665,16.215283767,13.078643951,13.042732109,17.0257123,18.261633011,15.416958655,13.432308236,14.306151645,-11.55676411,-9.977636332,-1.035018113,-2.065049045,-0.686459585,-7.644197359,-5.970149254,-5.606166783,-2.827854366,-3.934191702,0,0,0.3450060376,1.0325245225,1.029689377,2.7797081306,0.7023705004,1.7519271198,2.4743725698,2.1459227468,1.3596193066,-4.128677103,9.660169053,-2.753398727,8.923974601,-29.53439889,17.910447761,-4.204625088,-8.837044892,-12.51788269,1.3596193066,-4.128677103,10.005175091,-1.720874204,9.953663978,-26.75469076,18.612818262,-2.452697968,-6.362672322,-10.37195994 +050,2,4,20,041,Kansas,Dickinson County,19754,19747,19771,19686,19708,19436,19311,19214,18971,18829,18621,18381,18266,24,-85,22,-272,-125,-97,-243,-142,-208,-240,-115,64,257,208,215,226,238,240,201,199,172,179,40,234,261,249,217,240,257,235,245,196,208,24,23,-53,-34,9,-2,-17,-34,-46,-24,-29,1,10,9,8,6,5,-1,-1,0,0,1,1,-119,71,-249,-144,-99,-225,-108,-161,-216,-86,2,-109,80,-241,-138,-94,-226,-109,-161,-216,-85,-2,1,-5,3,4,-1,0,1,-1,0,-1,307,307,307,307,307,307,307,307,307,307,307,307,13.026839344,10.559983754,10.985080728,11.665419258,12.355613238,12.57038104,10.634920635,10.627503338,9.2967947679,9.7688760335,11.861013255,13.250748845,12.722256284,11.200867164,12.459441921,13.46078303,12.433862434,13.08411215,10.594021945,11.3515431,1.1658260892,-2.690765091,-1.737175557,0.4645520944,-0.103828683,-0.89040199,-1.798941799,-2.456608812,-1.297227177,-1.582667067,0.5068809083,0.456922374,0.4087471899,0.3097013962,0.2595717067,-0.052376588,-0.052910053,0,0,0.0545747264,-6.031882809,3.6046098391,-12.72225628,-7.43283351,-5.139519792,-11.78473222,-5.714285714,-8.598130841,-11.67504459,-4.693426474,-5.525001901,4.061532213,-12.31350909,-7.123132113,-4.879948086,-11.83710881,-5.767195767,-8.598130841,-11.67504459,-4.638851748 +050,2,4,20,043,Kansas,Doniphan County,7945,7948,7959,7961,7891,7876,7839,7789,7713,7655,7632,7584,7496,11,2,-70,-15,-37,-50,-76,-58,-23,-48,-88,18,94,84,83,70,82,83,78,83,81,88,10,68,82,76,75,82,79,96,108,70,74,8,26,2,7,-5,0,4,-18,-25,11,14,0,6,5,7,2,8,0,-1,-1,-1,-3,4,-29,-78,-29,-35,-58,-79,-40,5,-57,-99,4,-23,-73,-22,-33,-50,-79,-41,4,-58,-102,-1,-1,1,0,1,0,-1,1,-2,-1,0,427,427,427,427,427,427,427,427,427,427,427,427,11.809045226,10.598031794,10.52831864,8.9086859688,10.493985155,10.708295704,10.15096304,10.858899719,10.646687697,11.671087533,8.5427135678,10.345697704,9.6403881525,9.5450206809,10.493985155,10.19223326,12.493492972,14.129652646,9.2008412198,9.8143236074,3.2663316583,0.2523340903,0.8879304877,-0.636334712,0,0.5160624436,-2.342529932,-3.270752927,1.4458464774,1.8567639257,0.7537688442,0.6308352258,0.8879304877,0.2545338848,1.0238034297,0,-0.130140552,-0.130830117,-0.131440589,-0.397877984,-3.64321608,-9.841029523,-3.678569163,-4.454342984,-7.422574866,-10.19223326,-5.205622072,0.6541505855,-7.492113565,-13.12997347,-2.889447236,-9.210194297,-2.790638676,-4.1998091,-6.398771436,-10.19223326,-5.335762624,0.5233204684,-7.623554154,-13.52785146 +050,2,4,20,045,Kansas,Douglas County,110826,110826,111204,112500,113360,114779,116540,118265,119876,120516,121327,122269,122530,378,1296,860,1419,1761,1725,1611,640,811,942,261,290,1228,1266,1222,1226,1259,1269,1128,1129,1127,1101,119,606,593,712,663,677,710,730,814,742,754,171,622,673,510,563,582,559,398,315,385,347,95,651,630,657,642,871,751,287,438,260,211,110,22,-445,273,560,284,301,-38,61,291,-307,205,673,185,930,1202,1155,1052,249,499,551,-96,2,1,2,-21,-4,-12,0,-7,-3,6,10,8792,8804,8802,8794,8797,8800,8798,8797,8815,8818,8808,8814,10.978793406,11.210484371,10.712767216,10.600080408,10.723792083,10.657551619,9.3846717029,9.3366357513,9.2530255012,8.995134784,5.4178736187,5.2510404675,6.2418087219,5.7323436467,5.766487085,5.9628539395,6.0734134247,6.7316399482,6.0920540567,6.160155883,5.5609197869,5.9594439033,4.4709584946,4.8677367618,4.9573049978,4.6946976791,3.3112582781,2.6049958031,3.1609714445,2.8349789011,5.8201909666,5.5786770566,5.7596465313,5.5507762008,7.4189220843,6.3071877585,2.3877666478,3.6221846404,2.1346820145,1.7238632511,0.1966884812,-3.940494111,2.3932777824,4.8417985552,2.4190285556,2.5279141349,-0.316150288,0.5044595047,2.3892017931,-2.50818018,6.0168794478,1.6381829452,8.1529243137,10.392574756,9.8379506399,8.8351018934,2.0716163599,4.1266441452,4.5238838076,-0.784316929 +050,2,4,20,047,Kansas,Edwards County,3037,3037,3055,3021,2968,2969,3026,2955,2896,2871,2806,2783,2750,18,-34,-53,1,57,-71,-59,-25,-65,-23,-33,11,40,29,40,28,33,26,30,27,30,30,2,31,50,31,37,36,36,44,44,33,25,9,9,-21,9,-9,-3,-10,-14,-17,-3,5,0,-1,3,8,10,1,2,0,-1,0,0,8,-43,-35,-16,52,-70,-51,-10,-47,-21,-37,8,-44,-32,-8,62,-69,-49,-10,-48,-21,-37,1,1,0,0,4,1,0,-1,0,1,-1,35,35,35,35,35,35,35,35,35,35,35,35,13.166556945,9.6844214393,13.474818932,9.341117598,11.034943989,8.8873696804,10.404022889,9.5120662322,10.735373054,10.844026749,10.204081633,16.697278344,10.442984672,12.343619683,12.038120716,12.305588788,15.25923357,15.501144971,11.80891036,9.0366889572,2.9624753127,-7.012856904,3.0318342597,-3.002502085,-1.003176726,-3.418219108,-4.855210681,-5.989078739,-1.073537305,1.8073377914,-0.329163924,1.0018367006,2.6949637864,3.3361134279,0.3343922421,0.6836438216,0,-0.352298749,0,0,-14.15404872,-11.68809484,-5.389927573,17.347789825,-23.40745695,-17.43291745,-3.46800763,-16.55804122,-7.514761138,-13.37429966,-14.48321264,-10.68625814,-2.694963786,20.683903253,-23.0730647,-16.74927363,-3.46800763,-16.91033997,-7.514761138,-13.37429966 +050,2,4,20,049,Kansas,Elk County,2882,2882,2868,2786,2662,2634,2695,2572,2514,2511,2470,2507,2507,-14,-82,-124,-28,61,-123,-58,-3,-41,37,0,12,25,22,25,36,21,32,31,22,24,23,18,42,41,55,24,51,38,41,53,34,34,-6,-17,-19,-30,12,-30,-6,-10,-31,-10,-11,0,0,0,0,1,0,1,0,1,0,0,-8,-65,-109,2,47,-96,-51,7,-11,48,12,-8,-65,-109,2,48,-96,-50,7,-10,48,12,0,0,4,0,1,3,-2,0,0,-1,-1,40,40,40,40,40,40,40,40,40,40,40,40,8.843296781,8.0763582966,9.4410876133,13.510977669,7.9741788494,12.583562721,12.338308458,8.8335675567,9.6443640747,9.1743119266,14.856738592,15.051395007,20.770392749,9.0073184462,19.36586292,14.942980731,16.31840796,21.280867296,13.662849106,13.562026326,-6.013441811,-6.975036711,-11.32930514,4.5036592231,-11.39168407,-2.35941801,-3.980099502,-12.44729974,-4.018485031,-4.3877144,0,0,0,0.3753049353,0,0.393236335,0,0.401525798,0,0,-22.99257163,-40.01468429,0.7552870091,17.639331957,-36.45338903,-20.05505309,2.7860696517,-4.416783778,19.288728149,4.7865975269,-22.99257163,-40.01468429,0.7552870091,18.014636892,-36.45338903,-19.66181675,2.7860696517,-4.01525798,19.288728149,4.7865975269 +050,2,4,20,051,Kansas,Ellis County,28452,28452,28424,28772,29100,29044,28983,29030,28946,28755,28709,28652,28671,-28,348,328,-56,-61,47,-84,-191,-46,-57,19,89,391,402,382,354,355,360,318,309,306,296,81,225,233,267,254,242,245,272,245,242,261,8,166,169,115,100,113,115,46,64,64,35,9,44,59,57,65,107,57,58,82,47,42,-48,138,100,-229,-228,-172,-257,-295,-194,-168,-59,-39,182,159,-172,-163,-65,-200,-237,-112,-121,-17,3,0,0,1,2,-1,1,0,2,0,1,1033,1033,1033,1033,1033,1033,1033,1034,1036,1036,1037,1037,13.672284775,13.892728781,13.139790864,12.201216675,12.238636168,12.418931972,11.022339301,10.754559376,10.669270062,10.327442737,7.8676830548,8.0522532485,9.1840946615,8.7545452979,8.3429576129,8.4517731475,9.4279128611,8.5270778226,8.4377887415,9.1062924132,5.8046017204,5.8404755322,3.9556962025,3.4466713771,3.8956785548,3.9671588243,1.5944264397,2.2274815537,2.2314813201,1.2211503236,1.5385691307,2.0389825823,1.9606494221,2.2403363951,3.6888283661,1.9663308955,2.0103637719,2.8539607406,1.6387440944,1.4653803883,4.8255122736,3.4559026818,-7.876995047,-7.85841074,-5.929705411,-8.865737547,-10.22512608,-6.75205346,-5.857638465,-2.058510546,6.3640814043,5.494885264,-5.916345625,-5.618074345,-2.240877045,-6.899406651,-8.214762309,-3.898092719,-4.218894371,-0.593130157 +050,2,4,20,053,Kansas,Ellsworth County,6497,6499,6518,6467,6469,6372,6353,6311,6300,6295,6156,6093,6034,19,-51,2,-97,-19,-42,-11,-5,-139,-63,-59,21,55,69,64,51,65,53,63,57,54,48,24,86,72,75,86,102,81,90,97,65,75,-3,-31,-3,-11,-35,-37,-28,-27,-40,-11,-27,0,5,0,0,0,1,2,1,3,3,4,22,-24,5,-86,15,-6,14,21,-101,-54,-36,22,-19,5,-86,15,-5,16,22,-98,-51,-32,0,-1,0,0,1,0,1,0,-1,-1,0,983,983,983,983,983,982,980,978,978,978,978,978,8.4713130535,10.667903525,9.9680710225,8.0157170923,10.265319015,8.4053603997,10.003969829,9.1558910931,8.8170462895,7.9162200049,13.246053138,11.131725417,11.681333229,13.516699411,16.108654454,12.845928158,14.29138547,15.581077825,10.613111274,12.369093758,-4.774740085,-0.463821892,-1.713262207,-5.500982318,-5.843335439,-4.440567758,-4.287415641,-6.425186732,-1.796064985,-4.452873753,0.7701193685,0,0,0,0.1579279848,0.3171834113,0.1587931719,0.4818890049,0.489835905,0.6596850004,-3.696572969,0.7730364873,-13.39459544,2.3575638507,-0.947567909,2.2202838792,3.3346566098,-16.2235965,-8.817046289,-5.937165004,-2.9264536,0.7730364873,-13.39459544,2.3575638507,-0.789639924,2.5374672905,3.4934497817,-15.74170749,-8.327210385,-5.277480003 +050,2,4,20,055,Kansas,Finney County,36776,36785,36951,37114,37106,37069,37105,37127,36827,36685,36473,36351,35917,166,163,-8,-37,36,22,-300,-142,-212,-122,-434,198,754,672,709,684,730,669,632,650,595,608,70,181,209,228,209,206,239,209,214,214,223,128,573,463,481,475,524,430,423,436,381,385,33,142,108,160,158,173,154,40,84,79,58,7,-554,-590,-691,-609,-681,-888,-606,-733,-582,-873,40,-412,-482,-531,-451,-508,-734,-566,-649,-503,-815,-2,2,11,13,12,6,4,1,1,0,-4,548,548,548,548,548,548,547,547,547,547,547,547,20.360494161,18.108326597,19.116953151,18.443120231,19.66806768,18.092327663,17.194471651,17.769758605,16.34076678,16.826257818,4.8875987308,5.6319051469,6.1476238625,5.6353978483,5.5501670439,6.4634772967,5.6861464795,5.8503512945,5.8771833461,6.1714728511,15.47289543,12.47642145,12.969329289,12.807722383,14.117900636,11.628850366,11.508325171,11.91940731,10.463583434,10.654784967,3.8344697225,2.9102667745,4.3141220088,4.2602529188,4.6610626145,4.1647510615,1.0882576994,2.2963995735,2.1696144128,1.6051364366,-14.95983258,-15.8986796,-18.63161443,-16.42084828,-18.34788231,-24.0149282,-16.48710415,-20.03882009,-15.98374162,-24.16007085,-11.12536286,-12.98841283,-14.31749242,-12.16059536,-13.6868197,-19.85017714,-15.39884645,-17.74242051,-13.81412721,-22.55493441 +050,2,4,20,057,Kansas,Ford County,33848,33844,34006,34371,34661,34872,34923,34617,34446,34082,33623,33346,33094,162,365,290,211,51,-306,-171,-364,-459,-277,-252,160,664,711,668,674,660,618,681,527,587,562,94,248,220,246,230,226,251,269,233,217,240,66,416,491,422,444,434,367,412,294,370,322,21,88,108,255,364,319,283,71,146,133,95,71,-139,-310,-470,-771,-1072,-824,-851,-902,-780,-666,92,-51,-202,-215,-407,-753,-541,-780,-756,-647,-571,4,0,1,4,14,13,3,4,3,0,-3,708,708,708,708,708,708,708,708,708,708,708,708,19.421735379,20.599142427,19.213898437,19.31370442,18.981880932,17.89670301,19.875087555,15.567535633,17.530499186,16.917519567,7.2539011656,6.3738556032,7.0757769692,6.590729995,6.4998561979,7.2687256563,7.8508055102,6.882800384,6.4806104317,7.224563516,12.167834213,14.225286824,12.138121468,12.722974425,12.482024734,10.627977354,12.024282045,8.6847352485,11.049888754,9.6929560506,2.5739649297,3.1289836598,7.3346468583,10.430546601,9.1745757837,8.1954157798,2.0721456923,4.3128277084,3.9719870388,2.8597230584,-4.065694605,-8.981341986,-13.51876088,-22.09327316,-30.8311763,-23.86227068,-24.83656316,-26.64500406,-23.29436008,-20.04816376,-1.491729675,-5.852358327,-6.184114018,-11.66272656,-21.65660052,-15.6668549,-22.76441746,-22.33217635,-19.32237304,-17.1884407 +050,2,4,20,059,Kansas,Franklin County,25992,25994,25986,25861,25836,25747,25551,25495,25546,25667,25681,25618,25703,-8,-125,-25,-89,-196,-56,51,121,14,-63,85,84,335,322,303,315,329,303,299,317,294,293,90,231,250,236,272,249,279,293,274,241,262,-6,104,72,67,43,80,24,6,43,53,31,2,16,10,9,13,27,20,12,18,10,9,-1,-246,-104,-165,-256,-163,9,104,-47,-126,43,1,-230,-94,-156,-243,-136,29,116,-29,-116,52,-3,1,-3,0,4,0,-2,-1,0,0,2,478,478,478,478,478,478,478,478,478,479,479,479,12.922637761,12.457202546,11.74805653,12.281180553,12.890334208,11.872808135,11.676722707,12.347121602,11.462211739,11.41832778,8.9108337994,9.6717411068,9.1503014559,10.604701938,9.7559064373,10.932387688,11.442407201,10.672275454,9.3958946568,10.210245319,4.0118039617,2.7854614388,2.5977550743,1.6764786152,3.134427771,0.9404204463,0.2343155058,1.6748461479,2.0663170822,1.2080824614,0.6172006095,0.3868696443,0.3489521742,0.506842372,1.0578693727,0.7836837053,0.4686310117,0.7010983875,0.3898711476,0.3507336178,-9.489459371,-4.0234443,-6.397456526,-9.980895941,-6.386396583,0.3526576674,4.0614687677,-1.83064579,-4.91237646,1.6757272851,-8.872258761,-3.636574656,-6.048504352,-9.474053569,-5.328527211,1.1363413726,4.5300997794,-1.129547402,-4.522505312,2.0264609029 +050,2,4,20,061,Kansas,Geary County,34362,34352,35241,35309,37946,36857,36530,36783,35401,33935,32998,31992,32218,889,68,2637,-1089,-327,253,-1382,-1466,-937,-1006,226,250,1044,966,1079,1062,1091,1093,904,890,901,874,77,192,206,215,199,198,214,229,213,170,195,173,852,760,864,863,893,879,675,677,731,679,88,133,540,239,165,283,208,51,-12,38,39,569,-922,1271,-2248,-1377,-929,-2479,-2200,-1599,-1767,-489,657,-789,1811,-2009,-1212,-646,-2271,-2149,-1611,-1729,-450,59,5,66,56,22,6,10,8,-3,-8,-3,847,844,844,845,845,844,844,844,845,843,843,842,29.596031184,26.373626374,28.84911033,28.942455748,29.762797867,30.283719384,26.075920157,26.593757937,27.727342668,27.22317396,5.4429482636,5.6241894751,5.7484325495,5.4233038549,5.401497688,5.9292918098,6.6055151725,6.3645735288,5.2315740883,6.0738202772,24.15308292,20.749436899,23.10067778,23.519151893,24.361300179,24.354427574,19.470404984,20.229184408,22.49576858,21.149353683,3.7703756201,14.743020954,6.3901180434,4.4967092264,7.720322453,5.7630499834,1.4710972655,-0.358567523,1.1694106786,1.2147640554,-26.13749114,34.700703024,-60.10454126,-37.52708245,-25.34339067,-68.68558129,-63.45909773,-47.77912241,-54.37759655,-15.23127239,-22.36711552,49.443723978,-53.71442322,-33.03037323,-17.62306821,-62.92253131,-61.98800046,-48.13768993,-53.20818587,-14.01650833 +050,2,4,20,063,Kansas,Gove County,2695,2701,2692,2727,2762,2796,2749,2700,2621,2623,2612,2665,2621,-9,35,35,34,-47,-49,-79,2,-11,53,-44,5,31,38,32,29,44,35,32,32,45,41,12,37,31,48,40,41,40,35,27,26,43,-7,-6,7,-16,-11,3,-5,-3,5,19,-2,0,0,0,2,2,2,2,2,2,2,2,-3,41,29,48,-39,-56,-76,3,-18,32,-44,-3,41,29,50,-37,-54,-74,5,-16,34,-42,1,0,-1,0,1,2,0,0,0,0,0,56,56,56,56,56,56,56,56,56,56,56,56,11.441225318,13.845873565,11.514933429,10.45987376,16.149752248,13.155421913,12.204424104,12.225405922,17.055144969,15.512674991,13.655656025,11.295317909,17.272400144,14.427412083,15.048632777,15.034767901,13.348588863,10.315186246,9.8540837597,16.269390844,-2.214430707,2.5505556568,-5.757466715,-3.967538323,1.1011194715,-1.879345988,-1.14416476,1.9102196753,7.201061209,-0.756715853,0,0,0.7196833393,0.7213706041,0.7340796476,0.751738395,0.7627765065,0.7640878701,0.7580064431,0.7567158532,15.131943163,10.566587721,17.272400144,-14.06672678,-20.55423013,-28.56605901,1.1441647597,-6.876790831,12.128103089,-16.64774877,15.131943163,10.566587721,17.992083483,-13.34535618,-19.82015049,-27.81432062,1.9069412662,-6.112702961,12.886109532,-15.89103292 +050,2,4,20,065,Kansas,Graham County,2597,2588,2602,2635,2581,2588,2557,2591,2558,2485,2448,2441,2389,14,33,-54,7,-31,34,-33,-73,-37,-7,-52,7,25,29,25,24,26,17,25,19,23,23,3,32,34,32,24,39,39,38,39,37,42,4,-7,-5,-7,0,-13,-22,-13,-20,-14,-19,0,0,2,4,8,4,4,2,3,1,2,11,39,-51,10,-40,41,-14,-63,-20,7,-35,11,39,-49,14,-32,45,-10,-61,-17,8,-33,-1,1,0,0,1,2,-1,1,0,-1,0,40,40,40,40,40,40,40,40,40,40,40,40,9.5474508306,11.119631902,9.6730508802,9.3294460641,10.101010101,6.603223927,9.9147332937,7.7032231908,9.408877071,9.5238095238,12.220737063,13.036809816,12.381505127,9.3294460641,15.151515152,15.148572538,15.070394606,15.811879181,15.136019636,17.391304348,-2.673286233,-1.917177914,-2.708454246,0,-5.050505051,-8.545348611,-5.155661313,-8.10865599,-5.727142565,-7.867494824,0,0.7668711656,1.5476881408,3.1098153547,1.554001554,1.5536997475,0.7931786635,1.2162983985,0.4090816118,0.8281573499,14.894023296,-19.55521472,3.8692203521,-15.54907677,15.928515929,-5.437949116,-24.9851279,-8.10865599,2.8635712825,-14.49275362,14.894023296,-18.78834356,5.4169084929,-12.43926142,17.482517483,-3.884249369,-24.19194924,-6.892357592,3.2726528943,-13.66459627 +050,2,4,20,067,Kansas,Grant County,7829,7824,7825,7893,7833,7843,7784,7719,7660,7476,7271,7136,7077,1,68,-60,10,-59,-65,-59,-184,-205,-135,-59,26,127,115,120,127,131,119,124,113,121,119,21,59,45,64,46,58,49,57,70,36,34,5,68,70,56,81,73,70,67,43,85,85,5,5,0,-14,-14,-3,-6,-8,-3,-8,-5,-10,-5,-134,-36,-129,-137,-123,-245,-248,-210,-140,-5,0,-134,-50,-143,-140,-129,-253,-251,-218,-145,1,0,4,4,3,2,0,2,3,-2,1,79,79,79,79,79,79,79,79,79,79,79,79,16.159816771,14.62546102,15.310028068,16.253919498,16.899954847,15.475648612,16.384778013,15.325150878,16.797390158,16.745233237,7.5073164525,5.7230064861,8.1653483031,5.8872464325,7.4824227569,6.372325899,7.5317124736,9.4934562962,4.9975706254,4.7843523535,8.6525003181,8.9024545339,7.1446797652,10.366673066,9.4175320906,9.1033227128,8.8530655391,5.8316945819,11.799819532,11.960880884,0.6362132587,0,-1.786169941,-1.791770653,-0.387021867,-0.780284804,-1.057082452,-0.406862413,-1.11057125,-0.703581228,-0.636213259,-17.04184154,-4.593008421,-16.50988673,-17.67399858,-15.99583848,-32.37315011,-33.63395945,-29.15249531,-19.7002744,0,-17.04184154,-6.379178362,-18.30165739,-18.06102045,-16.77612328,-33.43023256,-34.04082186,-30.26306656,-20.40385563 +050,2,4,20,069,Kansas,Gray County,6006,6001,6026,6086,5963,5979,6060,6083,6043,6020,6085,5996,5954,25,60,-123,16,81,23,-40,-23,65,-89,-42,25,86,89,86,90,85,92,81,85,72,75,6,50,40,53,46,48,55,62,46,44,45,19,36,49,33,44,37,37,19,39,28,30,0,3,0,3,11,25,25,11,12,15,13,6,21,-178,-21,27,-39,-103,-54,13,-131,-85,6,24,-178,-18,38,-14,-78,-43,25,-116,-72,0,0,6,1,-1,0,1,1,1,-1,0,78,78,78,78,78,78,78,78,78,78,78,78,14.200792602,14.773010208,14.40294758,14.951407924,13.999835296,15.174006268,13.42949515,14.043783561,11.919543084,12.552301255,8.2562747688,6.6395551498,8.8762351365,7.6418307168,7.9057893437,9.0714167904,10.279366658,7.600165221,7.2841652181,7.5313807531,5.9445178336,8.1334550585,5.5267124435,7.3095772074,6.0940459524,6.1025894772,3.1501284921,6.4436183395,4.6353778661,5.0209205021,0.4953764861,0,0.502428404,1.8273943019,4.1175986165,4.1233712683,1.8237586007,1.9826517968,2.4832381425,2.1757322176,3.4676354029,-29.54602042,-3.516998828,4.4854223773,-6.423453842,-16.98828963,-8.952996767,2.1478727798,-21.68694644,-14.22594142,3.963011889,-29.54602042,-3.014570424,6.3128166791,-2.305855225,-12.86491836,-7.129238166,4.1305245766,-19.2037083,-12.05020921 +050,2,4,20,071,Kansas,Greeley County,1247,1248,1259,1255,1268,1283,1302,1302,1280,1227,1229,1211,1196,11,-4,13,15,19,0,-22,-53,2,-18,-15,4,15,18,23,25,16,17,14,26,12,12,6,10,21,16,19,25,21,26,22,18,11,-2,5,-3,7,6,-9,-4,-12,4,-6,1,0,0,0,1,3,4,4,2,3,2,1,11,-8,16,6,10,6,-22,-43,-5,-13,-19,11,-8,16,7,13,10,-18,-41,-2,-11,-18,2,-1,0,1,0,-1,0,0,0,-1,2,26,26,26,26,26,26,26,26,26,26,26,26,11.933174224,14.268727705,18.032144257,19.342359768,12.288786482,13.168086754,11.168727563,21.172638436,9.8360655738,9.9709181554,7.9554494829,16.646848989,12.544100353,14.700193424,19.201228879,16.266460108,20.741922617,17.915309446,14.754098361,9.1400083091,3.9777247414,-2.378121284,5.4880439044,4.6421663443,-6.912442396,-3.098373354,-9.573195054,3.2573289902,-4.918032787,0.8309098463,0,0,0.7840062721,2.3210831721,3.0721966206,3.098373354,1.595532509,2.4429967427,1.6393442623,0.8309098463,-6.364359586,12.683313516,4.7040376323,7.7369439072,4.6082949309,-17.04105345,-34.30394894,-4.071661238,-10.6557377,-15.78728708,-6.364359586,12.683313516,5.4880439044,10.058027079,7.6804915515,-13.94268009,-32.70841643,-1.628664495,-9.016393443,-14.95637723 +050,2,4,20,073,Kansas,Greenwood County,6689,6689,6680,6611,6427,6361,6290,6235,6104,6068,6008,6001,5868,-9,-69,-184,-66,-71,-55,-131,-36,-60,-7,-133,8,69,59,50,74,68,59,77,50,53,54,8,110,95,97,100,92,107,117,102,60,71,0,-41,-36,-47,-26,-24,-48,-40,-52,-7,-17,0,0,0,0,0,0,0,0,0,0,0,-8,-29,-151,-19,-44,-30,-83,3,-7,-1,-114,-8,-29,-151,-19,-44,-30,-83,3,-7,-1,-114,-1,1,3,0,-1,-1,0,1,-1,1,-2,90,90,90,90,90,90,90,90,90,90,90,90,10.382965917,9.0504678632,7.8198310916,11.698679946,10.858283433,9.563173677,12.65198817,8.2808877112,8.8267132984,9.0993344005,16.55255436,14.572787237,15.170472318,15.809026954,14.690618762,17.34338277,19.224449556,16.893010931,9.9925056208,11.963939675,-6.169588443,-5.522319374,-7.350641226,-4.110347008,-3.832335329,-7.780209093,-6.572461387,-8.61212322,-1.165792322,-2.864605274,0,0,0,0,0,0,0,0,0,0,-4.36385524,-23.16306182,-2.971535815,-6.95597186,-4.790419162,-13.45327822,0.492934604,-1.15932428,-0.16654176,-19.20970596,-4.36385524,-23.16306182,-2.971535815,-6.95597186,-4.790419162,-13.45327822,0.492934604,-1.15932428,-0.16654176,-19.20970596 +050,2,4,20,075,Kansas,Hamilton County,2690,2687,2705,2634,2648,2616,2654,2563,2628,2609,2584,2515,2425,18,-71,14,-32,38,-91,65,-19,-25,-69,-90,17,45,50,25,43,42,35,33,28,28,27,1,35,31,33,24,26,23,23,22,18,15,16,10,19,-8,19,16,12,10,6,10,12,1,2,5,11,39,19,20,7,12,14,10,1,-84,-10,-36,-20,-127,32,-36,-42,-94,-110,2,-82,-5,-25,19,-108,52,-29,-30,-80,-100,0,1,0,1,0,1,1,0,-1,1,-2,0,0,0,0,0,0,0,0,0,0,0,0,16.857089343,18.932222643,9.4984802432,16.318785579,16.101207591,13.484877673,12.602635096,10.783747352,10.982545597,10.931174089,13.111069489,11.737978039,12.537993921,9.1081593928,9.9674142227,8.8614910422,8.7836547642,8.4729443482,7.0602078839,6.0728744939,3.7460198539,7.1942446043,-3.039513678,7.210626186,6.1337933678,4.6233866307,3.8189803323,2.310803004,3.9223377133,4.8582995951,0.7492039708,1.8932222643,4.179331307,14.800759013,7.2838796243,7.7056443845,2.6732862326,4.6216060081,5.4912727986,4.048582996,-31.46656677,-3.786444529,-13.67781155,-7.590132827,-48.68698486,12.329031015,-13.7483292,-16.17562103,-36.8699745,-44.53441296,-30.7173628,-1.893222264,-9.498480243,7.210626186,-41.40310523,20.0346754,-11.07504296,-11.55401502,-31.37870171,-40.48582996 +050,2,4,20,077,Kansas,Harper County,6034,6034,6008,5938,5862,5844,5831,5785,5670,5581,5500,5442,5336,-26,-70,-76,-18,-13,-46,-115,-89,-81,-58,-106,13,68,62,83,87,79,73,65,64,67,66,34,98,86,86,79,92,97,81,103,79,94,-21,-30,-24,-3,8,-13,-24,-16,-39,-12,-28,1,5,1,1,4,5,1,0,0,0,0,-5,-45,-54,-15,-24,-39,-92,-72,-43,-47,-75,-4,-40,-53,-14,-20,-34,-91,-72,-43,-47,-75,-1,0,1,-1,-1,1,0,-1,1,1,-3,129,129,129,129,129,129,129,129,129,129,129,129,11.384563871,10.508474576,14.180762002,14.903640257,13.601928375,12.745525971,11.554528486,11.551304034,12.246390057,12.247170161,16.407165578,14.576271186,14.693319665,13.533190578,15.840220386,16.93583588,14.398720114,18.59037993,14.43977335,17.442939321,-5.022601708,-4.06779661,-0.512557663,1.3704496788,-2.238292011,-4.190309908,-2.844191627,-7.039075896,-2.193383294,-5.195769159,0.8371002846,0.1694915254,0.1708525542,0.6852248394,0.8608815427,0.1745962462,0,0,0,0,-7.533902562,-9.152542373,-2.562788314,-4.111349036,-6.714876033,-16.06285465,-12.79886232,-7.761032398,-8.590751234,-13.91723882,-6.696802277,-8.983050847,-2.391935759,-3.426124197,-5.85399449,-15.8882584,-12.79886232,-7.761032398,-8.590751234,-13.91723882 +050,2,4,20,079,Kansas,Harvey County,34684,34684,34740,34698,34769,34736,34621,34832,34777,34436,34225,34442,34291,56,-42,71,-33,-115,211,-55,-341,-211,217,-151,97,459,421,452,430,425,399,398,358,387,385,66,393,379,407,419,409,404,425,397,387,367,31,66,42,45,11,16,-5,-27,-39,0,18,9,30,20,50,77,60,75,32,55,53,43,20,-137,9,-129,-205,140,-124,-345,-228,165,-212,29,-107,29,-79,-128,200,-49,-313,-173,218,-169,-4,-1,0,1,2,-5,-1,-1,1,-1,0,1311,1311,1311,1311,1311,1311,1313,1313,1315,1317,1317,1317,13.220426856,12.120863144,13.006258543,12.399613593,12.238492218,11.464034823,11.500729632,10.428045033,11.271789943,11.20277014,11.319450445,10.911655894,11.71138767,12.082414176,11.777748981,11.607694407,12.280929883,11.564061112,11.271789943,10.679004263,1.9009764106,1.2092072495,1.2948708726,0.3171994175,0.4607432364,-0.143659584,-0.780200251,-1.136016079,0,0.5237658767,0.8640801866,0.5758129759,1.438745414,2.2203959225,1.7277871366,2.1548937637,0.9246817794,1.6020739576,1.5436818268,1.2512184831,-3.945966186,0.2591158392,-3.711963168,-5.91144369,4.0315033188,-3.562757689,-9.969225435,-6.64132477,4.8058019136,-6.168798103,-3.081885999,0.8349288151,-2.273217754,-3.691047767,5.7592904554,-1.407863926,-9.044543655,-5.039250812,6.3494837404,-4.91757962 +050,2,4,20,081,Kansas,Haskell County,4256,4256,4272,4235,4212,4124,4100,4087,4026,4019,3993,3987,3923,16,-37,-23,-88,-24,-13,-61,-7,-26,-6,-64,8,56,50,51,59,51,54,45,62,59,64,2,30,20,25,24,36,31,30,32,20,26,6,26,30,26,35,15,23,15,30,39,38,1,6,5,10,1,0,6,2,6,11,6,9,-70,-62,-127,-61,-28,-91,-22,-63,-55,-108,10,-64,-57,-117,-60,-28,-85,-20,-57,-44,-102,0,1,4,3,1,0,1,-2,1,-1,0,33,33,33,33,33,33,33,33,33,33,33,33,13.165628306,11.838522552,12.236084453,14.348249027,12.458776108,13.311968446,11.187072716,15.476784823,14.786967419,16.18204804,7.053015164,4.735409021,5.9980806142,5.8365758755,8.7944301942,7.6420559596,7.4580484773,7.988017973,5.0125313283,6.5739570164,6.1126131421,7.1031135314,6.2380038388,8.5116731518,3.6643459143,5.6699124861,3.7290242387,7.4887668497,9.7744360902,9.608091024,1.4106030328,1.1838522552,2.3992322457,0.2431906615,0,1.4791076051,0.4972032318,1.4977533699,2.7568922306,1.5170670038,-16.45703538,-14.67976796,-30.47024952,-14.83463035,-6.840112373,-22.43313201,-5.46923555,-15.72641038,-13.78446115,-27.30720607,-15.04643235,-13.49591571,-28.07101727,-14.59143969,-6.840112373,-20.95402441,-4.972032318,-14.22865701,-11.02756892,-25.79013906 +050,2,4,20,083,Kansas,Hodgeman County,1916,1918,1920,1957,1927,1923,1882,1868,1841,1858,1799,1763,1779,2,37,-30,-4,-41,-14,-27,17,-59,-36,16,10,19,21,28,21,24,18,21,13,13,13,3,20,17,17,15,25,21,24,27,24,31,7,-1,4,11,6,-1,-3,-3,-14,-11,-18,0,-1,-1,10,4,15,8,5,6,5,6,-5,39,-34,-26,-53,-28,-32,14,-50,-30,28,-5,38,-35,-16,-49,-13,-24,19,-44,-25,34,0,0,1,1,2,0,0,1,-1,0,0,14,14,14,14,14,14,14,14,14,14,14,14,9.8013928295,10.813594233,14.545454545,11.038107753,12.8,9.706120248,11.354420114,7.1096527208,7.299270073,7.3404856014,10.31725561,8.7538619979,8.8311688312,7.8843626807,13.333333333,11.323806956,12.97648013,14.766201805,13.475575519,17.504234896,-0.515862781,2.0597322348,5.7142857143,3.1537450723,-0.533333333,-1.617686708,-1.622060016,-7.656549084,-6.176305446,-10.16374929,-0.515862781,-0.514933059,5.1948051948,2.1024967148,8,4.3138312214,2.7034333604,3.2813781788,2.8074115665,3.3879164314,20.11864844,-17.507724,-13.50649351,-27.85808147,-14.93333333,-17.25532489,7.569613409,-27.34481816,-16.8444694,15.81027668,19.602785659,-18.02265705,-8.311688312,-25.75558476,-6.933333333,-12.94149366,10.273046769,-24.06343998,-14.03705783,19.198193111 +050,2,4,20,085,Kansas,Jackson County,13462,13460,13461,13429,13402,13312,13441,13286,13274,13347,13288,13164,13171,1,-32,-27,-90,129,-155,-12,73,-59,-124,7,35,160,167,172,156,168,166,193,168,168,164,48,117,125,131,125,143,137,143,158,143,142,-13,43,42,41,31,25,29,50,10,25,22,1,3,-3,-1,0,1,7,2,4,2,1,15,-79,-69,-133,100,-183,-48,22,-73,-150,-17,16,-76,-72,-134,100,-182,-41,24,-69,-148,-16,-2,1,3,3,-2,2,0,-1,0,-1,1,133,133,133,133,133,133,133,133,133,133,133,133,11.900334697,12.448287429,12.877143071,11.662243487,12.571556853,12.5,14.499830961,12.614980289,12.702253138,12.454907917,8.7021197471,9.3175804107,9.807591525,9.3447463836,10.700789464,10.31626506,10.743398069,11.864088605,10.812036897,10.784127587,3.1982149498,3.130707018,3.069551546,2.3174971031,1.8707673888,2.1837349398,3.7564328913,0.7508916839,1.8902162407,1.6707803304,0.2231312756,-0.22362193,-0.074867111,0,0.0748306956,0.5271084337,0.1502573157,0.3003566735,0.1512172993,0.0759445605,-5.875790257,-5.143304387,-9.957325747,7.4757971069,-13.69401729,-3.614457831,1.6528304722,-5.481509292,-11.34129744,-1.291057528,-5.652658981,-5.366926317,-10.03219286,7.4757971069,-13.61918659,-3.087349398,1.8030877878,-5.181152619,-11.19008015,-1.215112968 +050,2,4,20,087,Kansas,Jefferson County,19126,19108,19120,18941,18858,18767,18798,18789,18838,18935,18901,19165,19032,12,-179,-83,-91,31,-9,49,97,-34,264,-133,54,192,176,187,201,158,207,188,186,185,194,50,188,188,175,185,186,178,195,208,147,156,4,4,-12,12,16,-28,29,-7,-22,38,38,0,0,1,0,1,0,0,0,0,0,0,11,-185,-74,-103,14,22,21,105,-10,227,-171,11,-185,-73,-103,15,22,21,105,-10,227,-171,-3,2,2,0,0,-3,-1,-1,-2,-1,0,235,235,235,235,235,235,235,235,235,235,235,235,10.089067549,9.3124156724,9.9401993355,10.701450819,8.4071620507,11.002737396,9.95420009,9.8319061212,9.7199600694,10.157865801,9.8788786422,9.9473531046,9.3023255814,9.849594037,9.8970388698,9.4612910942,10.3248352,10.994819748,7.7234277308,8.1681807472,0.2101889073,-0.634937432,0.6378737542,0.8518567816,-1.489876819,1.5414463019,-0.37063511,-1.162913627,1.9965323386,1.9896850538,0,0.0529114527,0,0.0532410488,0,0,0,0,0,0,-9.721236962,-3.915447499,-5.475083056,0.7453746839,1.1706175007,1.1162197358,5.559526646,-0.528597103,11.926653707,-8.953582742,-9.721236962,-3.862536046,-5.475083056,0.7986157327,1.1706175007,1.1162197358,5.559526646,-0.528597103,11.926653707,-8.953582742 +050,2,4,20,089,Kansas,Jewell County,3077,3073,3063,3091,3055,3061,3044,2964,2890,2858,2832,2858,2833,-10,28,-36,6,-17,-80,-74,-32,-26,26,-25,5,29,24,23,38,22,41,31,30,19,25,12,48,43,39,47,44,32,31,46,36,40,-7,-19,-19,-16,-9,-22,9,0,-16,-17,-15,0,1,0,0,0,0,0,0,0,0,0,-2,44,-16,22,-8,-59,-83,-31,-10,43,-10,-2,45,-16,22,-8,-59,-83,-31,-10,43,-10,-1,2,-1,0,0,1,0,-1,0,0,0,27,27,27,27,27,27,27,28,27,27,27,27,9.4247643809,7.8099576961,7.5212557227,12.448812449,7.3235685752,14.007516228,10.786360473,10.544815466,6.6783831283,8.7858021437,15.59961001,13.992840872,12.753433617,15.397215397,14.64713715,10.932695593,10.786360473,16.168717047,12.653778559,14.05728343,-6.174845629,-6.182883176,-5.232177894,-2.948402948,-7.323568575,3.0748206355,0,-5.623901582,-5.975395431,-5.271481286,0.3249918752,0,0,0,0,0,0,0,0,0,14.299642509,-5.206638464,7.1942446043,-2.620802621,-19.64047936,-28.35667919,-10.78636047,-3.514938489,15.114235501,-3.514320857,14.624634384,-5.206638464,7.1942446043,-2.620802621,-19.64047936,-28.35667919,-10.78636047,-3.514938489,15.114235501,-3.514320857 +050,2,4,20,091,Kansas,Johnson County,544179,544181,545681,553034,559647,566661,573322,580158,586601,592055,599045,602948,607220,1500,7353,6613,7014,6661,6836,6443,5454,6990,3903,4272,1924,7402,7259,7370,7451,7511,7382,7223,7284,7099,7020,780,3410,3472,3729,3552,3893,3698,3952,4031,4181,4438,1144,3992,3787,3641,3899,3618,3684,3271,3253,2918,2582,170,1302,1059,1097,1247,2137,1941,630,1111,609,515,239,2071,1848,2326,1606,1146,846,1581,2640,362,1139,409,3373,2907,3423,2853,3283,2787,2211,3751,971,1654,-53,-12,-81,-50,-91,-65,-28,-28,-14,14,36,5166,5166,5166,5166,5165,5165,5165,5159,5162,5162,5162,5161,13.473921809,13.047764813,13.087006396,13.07212476,13.023199362,12.653855681,12.256332636,12.230711107,11.812048822,11.601694971,6.207251198,6.2407823985,6.6216345795,6.2316718758,6.7500086694,6.3389268906,6.7059430402,6.7685332886,6.9567792824,7.3345188437,7.2666706107,6.8069824145,6.4653718166,6.8404528839,6.2731906925,6.3149287899,5.5503895963,5.4621778188,4.8552695398,4.2671761276,2.3700413665,1.90351053,1.9479573971,2.1877519226,3.7053091514,3.3271652501,1.0690141992,1.8655024767,1.0133170493,0.8511214972,3.7698584255,3.3217067605,4.1303089386,2.8175858763,1.987030551,1.4501709436,2.6827165857,4.4328771724,0.6023329587,1.8823832724,6.139899792,5.2252172905,6.0782663357,5.0053377989,5.6923397025,4.7773361937,3.7517307849,6.2983796491,1.6156500079,2.7335047696 +050,2,4,20,093,Kansas,Kearny County,3977,3982,4001,3960,3974,3913,3940,3936,3896,3939,3926,3807,3745,19,-41,14,-61,27,-4,-40,43,-13,-119,-62,13,59,73,51,66,58,60,72,59,61,56,4,47,35,47,45,34,32,36,25,30,25,9,12,38,4,21,24,28,36,34,31,31,3,4,6,10,15,9,9,-2,-2,-2,0,7,-58,-31,-75,-11,-37,-78,9,-45,-148,-93,10,-54,-25,-65,4,-28,-69,7,-47,-150,-93,0,1,1,0,2,0,1,0,0,0,0,81,81,81,81,81,81,81,81,81,81,81,81,14.82225851,18.401814974,12.932674021,16.808862855,14.728288471,15.321756895,18.379068283,15.00317864,15.776542092,14.830508475,11.807561864,8.822788001,11.918346646,11.46058831,8.6338242763,8.1716036772,9.1895341417,6.3572790846,7.7589551274,6.6207627119,3.0146966461,9.5790269725,1.0143273742,5.3482745448,6.094464195,7.1501532176,9.1895341417,8.645899555,8.017586965,8.2097457627,1.004898882,1.512477943,2.5358184354,3.8201961034,2.2854240731,2.2982635342,-0.510529675,-0.508582327,-0.517263675,0,-14.57103379,-7.814469372,-19.01863827,-2.801477142,-9.395632301,-19.91828396,2.2973835354,-11.44310235,-38.27751196,-24.62923729,-13.56613491,-6.301991429,-16.48281983,1.0187189609,-7.110208228,-17.62002043,1.7868538609,-11.95168468,-38.79477564,-24.62923729 +050,2,4,20,095,Kansas,Kingman County,7858,7860,7857,7891,7827,7803,7687,7639,7407,7278,7148,7056,6974,-3,34,-64,-24,-116,-48,-232,-129,-130,-92,-82,16,86,70,73,97,91,68,76,58,79,65,12,87,98,109,87,124,122,172,217,138,94,4,-1,-28,-36,10,-33,-54,-96,-159,-59,-29,1,5,-2,-3,-1,-1,-1,0,0,0,0,-7,32,-35,17,-129,-13,-179,-33,29,-34,-53,-6,37,-37,14,-130,-14,-180,-33,29,-34,-53,-1,-2,1,-2,4,-1,2,0,0,1,0,190,190,190,190,190,190,190,190,190,190,190,190,10.922021844,8.9069856216,9.3410108765,12.524209167,11.875244682,9.0389472285,10.350697991,8.0410370165,11.123627147,9.2658588738,11.049022098,12.46977987,13.947536788,11.233053583,16.181652094,16.216934733,23.425263875,30.084569527,19.431146156,13.399857448,-0.127000254,-3.562794249,-4.606525912,1.2911555842,-4.306407412,-7.177987505,-13.07456588,-22.04353251,-8.307519009,-4.133998574,0.63500127,-0.254485303,-0.383877159,-0.129115558,-0.130497194,-0.132925695,0,0,0,0,4.064008128,-4.453492811,2.1753039028,-16.65590704,-1.696463526,-23.79369932,-4.494382022,4.0205185082,-4.787383836,-7.555238774,4.699009398,-4.707978114,1.7914267434,-16.7850226,-1.82696072,-23.92662502,-4.494382022,4.0205185082,-4.787383836,-7.555238774 +050,2,4,20,097,Kansas,Kiowa County,2553,2553,2569,2558,2512,2533,2530,2568,2509,2488,2490,2470,2456,16,-11,-46,21,-3,38,-59,-21,2,-20,-14,6,38,28,39,29,36,39,32,33,42,38,3,26,28,27,34,22,20,27,30,32,24,3,12,0,12,-5,14,19,5,3,10,14,0,3,3,2,6,3,3,2,4,3,1,12,-25,-50,7,-6,21,-82,-28,-5,-32,-30,12,-22,-47,9,0,24,-79,-26,-1,-29,-29,1,-1,1,0,2,0,1,0,0,-1,1,149,149,149,149,149,149,149,149,149,149,149,149,14.823483519,11.045364892,15.460852329,11.4556587,14.123185563,15.363403585,12.807684611,13.258336681,16.935483871,15.428339423,10.14238346,11.045364892,10.703666997,13.430772269,8.6308356218,7.878668505,10.80648389,12.053033347,12.903225806,9.7442143727,4.6811000585,0,4.757185332,-1.975113569,5.4923499412,7.4847350798,2.0012007204,1.2053033347,4.0322580645,5.6841250508,1.1702750146,1.1834319527,0.792864222,2.3701362828,1.1769321302,1.1818002758,0.8004802882,1.6070711129,1.2096774194,0.4060089322,-9.752291789,-19.72386588,2.775024777,-2.370136283,8.2385249117,-32.30254087,-11.20672403,-2.008838891,-12.90322581,-12.18026797,-8.582016774,-18.54043393,3.567888999,0,9.415457042,-31.12074059,-10.40624375,-0.401767778,-11.69354839,-11.77425903 +050,2,4,20,099,Kansas,Labette County,21607,21609,21536,21380,21165,20875,20779,20640,20323,20146,19929,19704,19586,-73,-156,-215,-290,-96,-139,-317,-177,-217,-225,-118,65,254,273,287,271,270,271,282,254,266,250,81,282,272,276,256,259,287,259,272,219,235,-16,-28,1,11,15,11,-16,23,-18,47,15,2,12,7,-2,-1,4,4,2,5,0,1,-64,-138,-229,-303,-110,-154,-306,-202,-205,-271,-133,-62,-126,-222,-305,-111,-150,-302,-200,-200,-271,-132,5,-2,6,4,0,0,1,0,1,-1,-1,480,480,480,480,480,480,480,480,480,480,480,480,11.837077081,12.833470443,13.653663178,13.011955635,13.03749487,13.231452774,13.936593442,12.676232065,13.42315747,12.725884449,13.14195172,12.786461394,13.130352046,12.291736688,12.506337671,14.012645558,12.799920927,13.574547723,11.051396563,11.962331382,-1.304874639,0.0470090492,0.5233111323,0.7202189466,0.5311571984,-0.781192784,1.1366725148,-0.898315658,2.3717609063,0.7635530669,0.5592319881,0.3290633447,-0.095147479,-0.048014596,0.1931480721,0.1952981959,0.0988410882,0.2495321273,0,0.0509035378,-6.431167863,-10.76507228,-14.41484301,-5.281605608,-7.436200777,-14.94031199,-9.982949912,-10.23081722,-13.67547246,-6.770170527,-5.871935875,-10.43600893,-14.50999049,-5.329620205,-7.243052705,-14.74501379,-9.884108824,-9.98128509,-13.67547246,-6.719266989 +050,2,4,20,101,Kansas,Lane County,1750,1749,1736,1743,1682,1698,1666,1630,1596,1549,1535,1527,1518,-13,7,-61,16,-32,-36,-34,-47,-14,-8,-9,3,22,20,22,23,18,16,16,14,21,18,8,28,26,22,22,28,32,28,39,18,17,-5,-6,-6,0,1,-10,-16,-12,-25,3,1,0,0,0,0,0,0,1,0,0,0,0,-8,14,-56,16,-34,-25,-20,-35,12,-12,-9,-8,14,-56,16,-34,-25,-19,-35,12,-12,-9,0,-1,1,0,1,-1,1,0,-1,1,-1,3,3,3,3,3,3,3,3,3,3,3,3,12.647312446,11.678832117,13.017751479,13.674197384,10.922330097,9.9194048357,10.174880763,9.0791180285,13.716525147,11.822660099,16.096579477,15.182481752,13.017751479,13.079667063,16.990291262,19.838809671,17.806041335,25.291828794,11.757021555,11.165845649,-3.449267031,-3.503649635,0,0.594530321,-6.067961165,-9.919404836,-7.631160572,-16.21271077,1.9595035924,0.6568144499,0,0,0,0,0,0.6199628022,0,0,0,0,8.0482897384,-32.70072993,9.4674556213,-20.21403092,-15.16990291,-12.39925604,-22.25755167,7.7821011673,-7.83801437,-5.911330049,8.0482897384,-32.70072993,9.4674556213,-20.21403092,-15.16990291,-11.77929324,-22.25755167,7.7821011673,-7.83801437,-5.911330049 +050,2,4,20,103,Kansas,Leavenworth County,76227,76220,76536,77116,77708,78177,78678,79269,80422,81259,81659,81911,82246,316,580,592,469,501,591,1153,837,400,252,335,234,945,978,936,963,1010,1041,943,965,1010,991,115,585,543,580,540,591,619,652,615,637,694,119,360,435,356,423,419,422,291,350,373,297,44,75,268,167,145,256,129,35,38,-11,14,154,148,-96,-43,-59,-77,601,513,12,-112,18,198,223,172,124,86,179,730,548,50,-123,32,-1,-3,-15,-11,-8,-7,1,-2,0,2,6,6561,6575,6558,6550,6550,6494,6462,6512,6506,6494,6513,6507,12.30052326,12.633700202,12.00885268,12.278856269,12.789100141,13.037679018,11.66494517,11.846450362,12.349452834,12.073807392,7.6146096374,7.0144163696,7.4413830709,6.8853399637,7.4835229539,7.7524719615,8.0652643168,7.549810334,7.7887143119,8.4553202117,4.685913623,5.619283832,4.567469609,5.3935163049,5.3055771873,5.2852070561,3.599680853,4.2966400275,4.5607385217,3.61848718,0.9762320048,3.4619955562,2.1426051256,1.8488412865,3.2415936992,1.6156201664,0.4329513053,0.4664923458,-0.134498991,0.1705684193,1.9264311561,-1.240117811,-0.551688745,-0.752287144,-0.975010605,7.5270365894,6.3458291327,0.1473133724,-1.369444275,0.2193022533,2.9026631609,2.2218777451,1.5909163807,1.0965541424,2.2665830943,9.1426567559,6.778780438,0.6138057182,-1.503943266,0.3898706726 +050,2,4,20,105,Kansas,Lincoln County,3241,3237,3241,3232,3179,3159,3182,3141,3075,3044,2994,2964,2986,4,-9,-53,-20,23,-41,-66,-31,-50,-30,22,9,36,40,27,27,37,31,31,25,24,24,2,46,44,34,32,34,43,34,37,31,41,7,-10,-4,-7,-5,3,-12,-3,-12,-7,-17,0,3,2,2,2,0,0,0,0,0,0,-2,-3,-53,-15,28,-47,-54,-29,-37,-22,38,-2,0,-51,-13,30,-47,-54,-29,-37,-22,38,-1,1,2,0,-2,3,0,1,-1,-1,1,50,50,50,50,50,50,50,50,50,50,50,50,11.123126835,12.478552488,8.5200378668,8.516006939,11.703305393,9.9742599743,10.132374571,8.2808877112,8.0563947633,8.0672268908,14.212884289,13.726407737,10.728936573,10.093045261,10.75438874,13.835263835,11.112926949,12.255713813,10.406176569,13.781512605,-3.089757454,-1.247855249,-2.208898706,-1.577038322,0.9489166535,-3.861003861,-0.980552378,-3.974826101,-2.349781806,-5.714285714,0.9269272362,0.6239276244,0.6311139161,0.6308153288,0,0,0,0,0,0,-0.926927236,-16.53408205,-4.73335437,8.8314146034,-14.8663609,-17.37451737,-9.478672986,-12.25571381,-7.385028533,12.773109244,0,-15.91015442,-4.102240454,9.4622299322,-14.8663609,-17.37451737,-9.478672986,-12.25571381,-7.385028533,12.773109244 +050,2,4,20,107,Kansas,Linn County,9656,9656,9624,9610,9481,9538,9532,9574,9604,9694,9771,9714,9654,-32,-14,-129,57,-6,42,30,90,77,-57,-60,23,94,103,77,114,97,103,110,99,94,94,39,107,119,117,115,101,105,128,119,103,128,-16,-13,-16,-40,-1,-4,-2,-18,-20,-9,-34,0,1,0,1,1,0,1,0,1,0,0,-15,-2,-115,97,-6,46,31,108,96,-48,-27,-15,-1,-115,98,-5,46,32,108,97,-48,-27,-1,0,2,-1,0,0,0,0,0,0,1,63,63,63,63,63,63,63,63,63,63,63,63,9.7743579079,10.790424808,8.0971659919,11.955951757,10.153878363,10.741474606,11.400145093,10.172103776,9.6484475237,9.7067327551,11.12613081,12.466607302,12.303485988,12.060828526,10.572594996,10.950046929,13.265623381,12.227074236,10.572235053,13.217678645,-1.351772902,-1.676182494,-4.206319996,-0.10487677,-0.418716634,-0.208572322,-1.865478288,-2.05497046,-0.923787529,-3.51094589,0.1039825309,0,0.1051579999,0.1048767698,0,0.1042861612,0,0.102748523,0,0,-0.207965062,-12.04756168,10.20032599,-0.629260619,4.8152412855,3.232870998,11.192869727,9.863858207,-4.926866821,-2.788104089,-0.103982531,-12.04756168,10.30548399,-0.524383849,4.8152412855,3.3371571592,11.192869727,9.96660673,-4.926866821,-2.788104089 +050,2,4,20,109,Kansas,Logan County,2756,2759,2774,2766,2794,2775,2767,2785,2821,2812,2804,2776,2732,15,-8,28,-19,-8,18,36,-9,-8,-28,-44,12,32,31,33,36,37,51,41,47,47,46,8,40,32,37,49,43,22,36,36,33,19,4,-8,-1,-4,-13,-6,29,5,11,14,27,1,5,1,0,0,1,0,1,1,1,1,9,-5,28,-14,5,23,7,-14,-19,-43,-72,10,0,29,-14,5,24,7,-13,-18,-42,-71,1,0,0,-1,0,0,0,-1,-1,0,0,41,41,41,41,41,41,41,41,41,41,41,41,11.55234657,11.151079137,11.851319806,12.991699747,13.328530259,18.194791295,14.557074383,16.737891738,16.845878136,16.702977487,14.440433213,11.510791367,13.287843419,17.683146878,15.489913545,7.8487334998,12.78182141,12.820512821,11.827956989,6.8990559187,-2.888086643,-0.35971223,-1.436523613,-4.691447131,-2.161383285,10.346057795,1.7752529735,3.9173789174,5.017921147,9.8039215686,1.8050541516,0.3597122302,0,0,0.3602305476,0,0.3550505947,0.3561253561,0.3584229391,0.3631082062,-1.805054152,10.071942446,-5.027832645,1.8044027427,8.2853025937,2.4973242954,-4.970708326,-6.766381766,-15.41218638,-26.14379085,0,10.431654676,-5.027832645,1.8044027427,8.6455331412,2.4973242954,-4.615657731,-6.41025641,-15.05376344,-25.78068264 +050,2,4,20,111,Kansas,Lyon County,33690,33692,33647,33651,33544,33478,33148,33142,33367,33246,33302,33224,33045,-45,4,-107,-66,-330,-6,225,-121,56,-78,-179,109,417,418,434,413,398,415,407,409,396,401,45,311,278,280,294,283,290,255,329,269,299,64,106,140,154,119,115,125,152,80,127,102,21,106,109,87,105,126,85,13,36,24,20,-138,-208,-365,-310,-564,-248,18,-289,-60,-230,-302,-117,-102,-256,-223,-459,-122,103,-276,-24,-206,-282,8,0,9,3,10,1,-3,3,0,1,1,1444,1444,1444,1444,1444,1445,1446,1447,1449,1449,1451,1452,12.392641683,12.44140189,12.950971323,12.397562513,12.00784432,12.479514051,12.219836969,12.291879546,11.905119803,12.102189561,9.2424737734,8.2744251804,8.3554653696,8.8253834839,8.538241062,8.7206242764,7.6561632114,9.8875999279,8.0870637044,9.0238271288,3.1501679099,4.1669767096,4.5955059533,3.5721790292,3.4696032584,3.7588897743,4.5636737574,2.4042796177,3.8180560984,3.0783624319,3.1501679099,3.2442890096,2.5961624541,3.1519226728,3.8014783527,2.5560450465,0.3903142029,1.081925828,0.7215224123,0.6036004768,-6.181461559,-10.86390356,-9.250693802,-16.9303275,-7.482274853,0.5412801275,-8.676984973,-1.803209713,-6.914589784,-9.1143672,-3.031293649,-7.619614555,-6.654531348,-13.77840483,-3.6807965,3.097325174,-8.28667077,-0.721283885,-6.193067372,-8.510766724 +050,2,4,20,113,Kansas,McPherson County,29180,29186,29128,29158,29226,29424,28908,28667,28466,28722,28565,28584,28448,-58,30,68,198,-516,-241,-201,256,-157,19,-136,75,320,340,366,317,347,332,308,316,286,294,101,345,364,384,411,367,369,374,403,325,356,-26,-25,-24,-18,-94,-20,-37,-66,-87,-39,-62,5,22,13,16,5,17,14,8,12,4,2,-36,34,85,202,-438,-238,-179,315,-80,53,-76,-31,56,98,218,-433,-221,-165,323,-68,57,-74,-1,-1,-6,-2,11,0,1,-1,-2,1,0,925,925,925,925,925,925,925,925,927,928,928,928,10.980338332,11.647026583,12.480818414,10.868819859,12.053842814,11.622004796,10.771490522,11.032171348,10.008924041,10.310001403,11.838177264,12.469169636,13.094629156,14.091750669,12.748588797,12.917228222,13.079667063,14.069509662,11.373777319,12.484219386,-0.857838932,-0.822143053,-0.613810742,-3.22293081,-0.694745983,-1.295223426,-2.308176541,-3.037338314,-1.364853278,-2.174217983,0.7548982603,0.445327487,0.5456095482,0.1714324899,0.590534086,0.4900845396,0.2797789746,0.4189432157,0.1399849516,0.070136064,1.1666609477,2.9117566457,6.8883205456,-15.01748611,-8.267477204,-6.266080899,11.016297125,-2.792954772,1.8548006089,-2.665170431,1.921559208,3.3570841326,7.4339300938,-14.84605362,-7.676943118,-5.775996359,11.2960761,-2.374011556,1.9947855606,-2.595034367 +050,2,4,20,115,Kansas,Marion County,12660,12660,12671,12546,12378,12206,12188,12054,12008,11950,11885,11831,11652,11,-125,-168,-172,-18,-134,-46,-58,-65,-54,-179,34,119,109,110,120,116,103,121,115,115,108,18,172,174,151,168,191,170,174,152,149,151,16,-53,-65,-41,-48,-75,-67,-53,-37,-34,-43,0,5,9,10,9,12,8,4,5,5,6,-4,-76,-116,-144,22,-69,12,-7,-33,-25,-140,-4,-71,-107,-134,31,-57,20,-3,-28,-20,-134,-1,-1,4,3,-1,-2,1,-2,0,0,-2,723,723,723,723,723,723,723,724,726,726,727,727,9.4380774874,8.7465896325,8.9489098601,9.8384848733,9.5701674779,8.5612168565,10.101010101,9.6496748479,9.6980941137,9.1981433377,13.64159099,13.962445835,12.284412626,13.773878823,15.757775761,14.130163744,14.525419484,12.754352842,12.565356721,12.860367074,-4.203513503,-5.215856203,-3.335502766,-3.935393949,-6.187608283,-5.568946887,-4.424409383,-3.104677995,-2.867262608,-3.662223736,0.3965578776,0.7221954742,0.81353726,0.7378863655,0.9900173253,0.6649488821,0.3339176893,0.4195510803,0.4216562658,0.5110079632,-6.02767974,-9.308297224,-11.71493654,1.8037222268,-5.69259962,0.9974233231,-0.584355956,-2.76903713,-2.108281329,-11.92351914,-5.631121862,-8.586101749,-10.90139928,2.5416085923,-4.702582295,1.6623722051,-0.250438267,-2.34948605,-1.686625063,-11.41251118 +050,2,4,20,117,Kansas,Marshall County,10117,10117,10112,9985,10027,9975,9947,9848,9805,9697,9718,9691,9652,-5,-127,42,-52,-28,-99,-43,-108,21,-27,-39,29,107,128,118,130,121,132,112,125,112,114,24,135,123,137,127,128,109,145,146,119,110,5,-28,5,-19,3,-7,23,-33,-21,-7,4,1,3,2,3,2,4,10,2,4,4,3,-12,-101,36,-33,-33,-96,-76,-75,38,-23,-47,-11,-98,38,-30,-31,-92,-66,-73,42,-19,-44,1,-1,-1,-3,0,0,0,-2,0,-1,1,164,164,164,164,164,164,164,164,164,164,164,164,10.648355476,12.792324605,11.798820118,13.050898504,12.225309422,13.433063654,11.486001436,12.876641772,11.541037663,11.787209843,13.434841021,12.292624425,13.698630137,12.749723923,12.932558727,11.092454078,14.870269716,15.039917589,12.262352517,11.373623533,-2.786485545,0.4997001799,-1.899810019,0.3011745809,-0.707249305,2.3406095761,-3.38426828,-2.163275818,-0.721314854,0.4135863103,0.2985520227,0.199880072,0.299970003,0.2007830539,0.4041424602,1.0176563375,0.2051071685,0.4120525367,0.4121799165,0.3101897327,-10.05125143,3.5978412952,-3.299670033,-3.31292039,-9.699419045,-7.734188165,-7.691518819,3.9144990986,-2.37003452,-4.859639146,-9.752699408,3.7977213672,-2.99970003,-3.112137336,-9.295276585,-6.716531827,-7.48641165,4.3265516353,-1.957854604,-4.549449413 +050,2,4,20,119,Kansas,Meade County,4575,4575,4596,4519,4378,4284,4355,4298,4230,4226,4091,4023,4029,21,-77,-141,-94,71,-57,-68,-4,-135,-68,6,9,52,61,60,58,63,57,52,59,46,53,4,50,56,41,56,45,47,61,60,36,38,5,2,5,19,2,18,10,-9,-1,10,15,0,2,0,11,21,8,8,2,3,5,5,17,-82,-151,-127,49,-85,-86,3,-138,-84,-14,17,-80,-151,-116,70,-77,-78,5,-135,-79,-9,-1,1,5,3,-1,2,0,0,1,1,0,119,119,119,119,119,119,119,119,119,119,119,119,11.409764125,13.712487355,13.853613484,13.427480032,14.561423784,13.367729831,12.298959319,14.187808104,11.338427409,13.164431197,10.970927043,12.588512982,9.4666358809,12.96446348,10.401016988,11.022514071,14.427625355,14.428279428,8.8735518856,9.4386487829,0.4388370817,1.1239743734,4.3869776033,0.4630165528,4.1604067953,2.3452157598,-2.128666036,-0.240471324,2.4648755238,3.7257824143,0.4388370817,0,2.5398291388,4.8616738048,1.8490696868,1.8761726079,0.4730368969,0.7214139714,1.2324377619,1.2419274714,-17.99232035,-33.94402608,-29.32348187,11.343905545,-19.64636542,-20.16885553,0.7095553453,-33.18504268,-20.7049544,-3.47739692,-17.55348327,-33.94402608,-26.78365274,16.205579349,-17.79729574,-18.29268293,1.1825922422,-32.46362871,-19.47251664,-2.235469449 +050,2,4,20,121,Kansas,Miami County,32787,32781,32882,32743,32681,32850,32889,32782,32960,33450,33714,34244,34334,101,-139,-62,169,39,-107,178,490,264,530,90,111,344,385,333,368,347,361,366,383,372,374,46,280,236,258,269,331,312,297,335,262,320,65,64,149,75,99,16,49,69,48,110,54,0,-4,0,9,9,21,24,3,8,3,1,40,-201,-221,88,-71,-144,107,419,211,418,35,40,-205,-221,97,-62,-123,131,422,219,421,36,-4,2,10,-3,2,0,-2,-1,-3,-1,0,645,645,645,645,645,645,645,644,645,644,644,644,10.483809524,11.769381267,10.163128901,11.19578941,10.567830549,10.982324846,11.02243638,11.404919302,10.947938433,10.907288052,8.5333333333,7.2144778674,7.8741359051,8.1838786717,10.08055306,9.491649174,8.9444360789,9.9755821571,7.71064481,9.3324389746,1.9504761905,4.5549033994,2.2889929957,3.0119107379,0.4872774893,1.4906756716,2.0780003012,1.4293371449,3.2372936225,1.574849077,-0.121904762,0,0.2746791595,0.2738100671,0.6395517047,0.7301268595,0.0903478392,0.2382228575,0.0882898261,0.0291638718,-6.125714286,-6.755930545,2.6857517816,-2.160057196,-4.385497404,3.2551489155,12.618581539,6.2831278661,12.301715766,1.0207355128,-6.247619048,-6.755930545,2.9604309411,-1.886247129,-3.745945699,3.985275775,12.708929378,6.5213507236,12.390005592,1.0498993846 +050,2,4,20,123,Kansas,Mitchell County,6373,6373,6336,6284,6302,6309,6248,6295,6193,6132,6096,5967,5879,-37,-52,18,7,-61,47,-102,-61,-36,-129,-88,10,81,71,82,77,93,70,73,85,71,72,29,91,93,95,86,73,89,90,79,94,104,-19,-10,-22,-13,-9,20,-19,-17,6,-23,-32,0,0,3,9,10,11,0,0,1,0,1,-19,-41,35,13,-64,15,-84,-44,-43,-106,-56,-19,-41,38,22,-54,26,-84,-44,-42,-106,-55,1,-1,2,-2,2,1,1,0,0,0,-1,246,246,246,246,246,246,246,246,246,246,246,246,12.836767036,11.282377245,13.004519864,12.264075814,14.82898828,11.210762332,11.845841785,13.902518809,11.771532786,12.156002026,14.42155309,14.778325123,15.066212037,13.697539221,11.639958543,14.253683536,14.604462475,12.92116454,15.584846224,17.558669593,-1.584786054,-3.495947879,-2.061692173,-1.433463407,3.1890297377,-3.042921204,-2.75862069,0.9813542689,-3.813313438,-5.402667567,0,0.4767201653,1.4273253509,1.5927371187,1.7539663557,0,0,0.1635590448,0,0.1688333615,-6.497622821,5.5617352614,2.0616921735,-10.19351756,2.3917723033,-13.4529148,-7.139959432,-7.033038927,-17.57440106,-9.454668242,-6.497622821,6.0384554267,3.4890175244,-8.600780441,4.145738659,-13.4529148,-7.139959432,-6.869479882,-17.57440106,-9.285834881 +050,2,4,20,125,Kansas,Montgomery County,35471,35468,35353,34790,34483,34458,34109,33458,32850,32382,32040,31796,31502,-115,-563,-307,-25,-349,-651,-608,-468,-342,-244,-294,116,424,513,452,428,451,409,383,349,357,344,136,452,446,433,417,439,470,453,466,400,371,-20,-28,67,19,11,12,-61,-70,-117,-43,-27,7,46,41,61,78,85,70,41,58,42,37,-105,-583,-424,-102,-448,-756,-620,-438,-283,-246,-302,-98,-537,-383,-41,-370,-671,-550,-397,-225,-204,-265,3,2,9,-3,10,8,3,-1,0,3,-2,1112,1112,1112,1114,1114,1113,1114,1114,1112,1114,1113,1113,12.089588412,14.810965311,13.112661551,12.484139601,13.349712138,12.336369669,11.742702968,10.834807985,11.184911335,10.869221776,12.887957458,12.876589725,12.561465601,12.163285546,12.994509154,14.176268324,13.888888889,14.46710751,12.532113541,11.7223293,-0.798369046,1.9343755864,0.5511959502,0.3208540552,0.3552029837,-1.839898655,-2.146185921,-3.632299525,-1.347202206,-0.853107523,1.31160629,1.1837223738,1.7696291031,2.2751469366,2.5160211346,2.111359112,1.2570517537,1.800627115,1.3158719218,1.1690732725,-16.62318407,-12.24142162,-2.959051943,-13.06751061,-22.37778797,-18.70060928,-13.42899191,-8.785818509,-7.707249828,-9.542165629,-15.31157778,-11.05769925,-1.18942284,-10.79236367,-19.86176684,-16.58925017,-12.17194015,-6.985191394,-6.391377906,-8.373092357 +050,2,4,20,127,Kansas,Morris County,5923,5923,5918,5864,5849,5720,5665,5630,5553,5471,5551,5623,5559,-5,-54,-15,-129,-55,-35,-77,-82,80,72,-64,11,55,66,76,46,67,49,71,71,65,66,6,87,83,73,66,87,85,77,73,62,73,5,-32,-17,3,-20,-20,-36,-6,-2,3,-7,0,0,3,2,3,9,16,6,8,5,5,-9,-22,0,-137,-40,-23,-57,-82,75,65,-63,-9,-22,3,-135,-37,-14,-41,-76,83,70,-58,-1,0,-1,3,2,-1,0,0,-1,-1,1,66,66,66,66,66,66,66,66,66,66,66,66,9.3362756748,11.269529583,13.138559945,8.0808080808,11.863656485,8.7633014397,12.880986938,12.883324261,11.634150707,11.804686103,14.768290613,14.172287202,12.619932578,11.594202899,15.405046481,15.201645355,13.969521045,13.246234803,11.097189905,13.056698265,-5.432014938,-2.90275762,0.5186273662,-3.513394818,-3.541389996,-6.438343915,-1.088534107,-0.362910543,0.5369608019,-1.252012162,0,0.5122513447,0.3457515775,0.5270092227,1.593625498,2.8614861844,1.0885341074,1.4516421702,0.8949346698,0.8942944017,-3.73451027,0,-23.68398306,-7.026789635,-4.072598495,-10.19404453,-14.8766328,13.609145346,11.634150707,-11.26810946,-3.73451027,0.5122513447,-23.33823148,-6.499780413,-2.478972997,-7.332558347,-13.78809869,15.060787516,12.529085377,-10.37381506 +050,2,4,20,129,Kansas,Morton County,3233,3233,3241,3176,3126,3114,3039,2950,2802,2743,2662,2536,2538,8,-65,-50,-12,-75,-89,-148,-59,-81,-126,2,15,36,40,55,28,26,37,27,36,21,20,2,50,32,30,39,46,37,35,32,24,25,13,-14,8,25,-11,-20,0,-8,4,-3,-5,3,5,-3,-4,-4,2,4,1,4,0,1,-8,-57,-56,-34,-61,-73,-151,-52,-90,-122,5,-5,-52,-59,-38,-65,-71,-147,-51,-86,-122,6,0,1,1,1,1,2,-1,0,1,-1,1,83,83,83,83,83,83,83,83,83,83,83,83,11.220196353,12.694382736,17.628205128,9.1012514221,8.6825847387,12.865090403,9.738503156,13.320999075,8.0800307811,7.8833267639,15.583606046,10.155506189,9.6153846154,12.676743052,15.361496076,12.865090403,12.623985573,11.840888067,9.2343208927,9.8541584549,-4.363409693,2.5388765471,8.0128205128,-3.57549163,-6.678911337,0,-2.885482417,1.4801110083,-1.154290112,-1.970831691,1.5583606046,-0.952078705,-1.282051282,-1.300178775,0.6678911337,1.3908205841,0.3606853021,1.4801110083,0,0.3941663382,-17.76531089,-17.77213583,-10.8974359,-19.82772631,-24.37802638,-52.50347705,-18.75563571,-33.30249769,-46.9411312,1.970831691,-16.20695029,-18.72421454,-12.17948718,-21.12790509,-23.71013525,-51.11265647,-18.39495041,-31.82238668,-46.9411312,2.3649980292 +050,2,4,20,131,Kansas,Nemaha County,10178,10178,10159,10087,10070,10097,10092,10099,10102,10063,10085,10170,10121,-19,-72,-17,27,-5,7,3,-39,22,85,-49,39,125,112,156,142,147,149,138,150,151,146,44,137,137,137,136,131,101,137,136,106,94,-5,-12,-25,19,6,16,48,1,14,45,52,0,1,1,2,5,8,6,0,0,0,0,-14,-60,8,9,-13,-17,-51,-41,9,41,-101,-14,-59,9,11,-8,-9,-45,-41,9,41,-101,0,-1,-1,-3,-3,0,0,1,-1,-1,0,259,259,259,259,259,259,259,259,259,259,259,259,12.348118147,11.112764796,15.470818664,14.067066224,14.560942994,14.751744963,13.687081577,14.889815366,14.90989879,14.390616529,13.533537489,13.593292653,13.586552288,13.472683144,12.976078451,9.999504975,13.587899826,13.500099265,10.466551469,9.2651914642,-1.185419342,-2.480527856,1.8842663758,0.5943830799,1.5848645436,4.7522399881,0.0991817506,1.3897161009,4.4433473216,5.1254250653,0.0987849452,0.0992211143,0.198343829,0.4953192332,0.7924322718,0.5940299985,0,0,0,0,-5.92709671,0.793768914,0.8925472306,-1.287830006,-1.683918578,-5.049254987,-4.066451773,0.893388922,4.0483831153,-9.955152531,-5.828311765,0.8929900283,1.0908910597,-0.792510773,-0.891486306,-4.455224989,-4.066451773,0.893388922,4.0483831153,-9.955152531 +050,2,4,20,133,Kansas,Neosho County,16512,16511,16476,16454,16425,16390,16332,16291,16131,16098,15984,15899,15929,-35,-22,-29,-35,-58,-41,-160,-33,-114,-85,30,53,226,219,230,214,206,205,199,176,164,161,61,223,195,194,201,203,198,200,208,193,184,-8,3,24,36,13,3,7,-1,-32,-29,-23,4,29,24,10,5,38,51,31,41,33,24,-32,-54,-78,-81,-73,-82,-216,-64,-124,-88,27,-28,-25,-54,-71,-68,-44,-165,-33,-83,-55,51,1,0,1,0,-3,0,-2,1,1,-1,2,450,450,450,450,450,450,450,450,450,450,450,451,13.726085636,13.321573041,14.017979583,13.079885093,12.62912669,12.645734378,12.349126563,10.971884546,10.287614089,10.11687822,13.54388096,11.861674625,11.823861039,12.285312634,12.445207369,12.213928814,12.411182475,12.966772645,12.106765361,11.562146538,0.1822046766,1.4598984154,2.1941185433,0.7945724589,0.1839193207,0.4318055641,-0.062055912,-1.994888099,-1.819151272,-1.445268317,1.7613118737,1.4598984154,0.6094773732,0.3056047919,2.3296447292,3.1460119672,1.9237332837,2.5559503772,2.0700686886,1.5081060701,-3.279684179,-4.74466985,-4.936766723,-4.461829961,-5.0271281,-13.32428598,-3.971578392,-7.730191385,-5.52018317,1.6966193289,-1.518372305,-3.284771435,-4.327289349,-4.15622517,-2.697483371,-10.17827401,-2.047845108,-5.174241007,-3.450114481,3.204725399 +050,2,4,20,135,Kansas,Ness County,3107,3107,3103,3118,3077,3087,3090,3022,2966,2864,2811,2782,2768,-4,15,-41,10,3,-68,-56,-102,-53,-29,-14,9,30,35,39,34,38,37,19,27,35,35,15,39,47,33,51,50,53,41,51,36,38,-6,-9,-12,6,-17,-12,-16,-22,-24,-1,-3,0,0,0,11,16,9,11,3,12,14,13,3,24,-27,-7,4,-65,-50,-84,-41,-42,-23,3,24,-27,4,20,-56,-39,-81,-29,-28,-10,-1,0,-2,0,0,0,-1,1,0,0,-1,70,70,70,70,70,70,70,70,70,70,70,70,9.6447516476,11.299435028,12.654120701,11.008580217,12.434554974,12.358049432,6.5180102916,9.5154185022,12.515644556,12.612612613,12.538177142,15.173527038,10.707332901,16.512870325,16.361256545,17.702070808,14.065180103,17.973568282,12.8732344,13.693693694,-2.893425494,-3.87409201,1.9467878001,-5.504290108,-3.926701571,-5.344021376,-7.547169811,-8.45814978,-0.357589844,-1.081081081,0,0,3.5691109669,5.1805083374,2.945026178,3.6740146961,1.0291595197,4.2290748899,5.0062578223,4.6846846847,7.7158013181,-8.716707022,-2.271252433,1.2951270843,-21.26963351,-16.7000668,-28.81646655,-14.44933921,-15.01877347,-8.288288288,7.7158013181,-8.716707022,1.2978585334,6.4756354217,-18.32460733,-13.0260521,-27.78730703,-10.22026432,-10.01251564,-3.603603604 +050,2,4,20,137,Kansas,Norton County,5671,5669,5664,5656,5589,5617,5536,5538,5504,5432,5443,5372,5328,-5,-8,-67,28,-81,2,-34,-72,11,-71,-44,10,47,44,61,54,52,68,55,53,56,56,20,61,46,70,56,69,66,70,49,63,68,-10,-14,-2,-9,-2,-17,2,-15,4,-7,-12,0,-1,-1,2,3,1,7,5,6,4,3,5,9,-66,37,-84,19,-44,-62,0,-66,-36,5,8,-67,39,-81,20,-37,-57,6,-62,-33,0,-2,2,-2,2,-1,1,0,1,-2,1,822,822,822,822,822,822,821,820,818,817,817,818,8.3038869258,7.8257003112,10.887024808,9.6834932305,9.3913671663,12.31660931,10.058522312,9.7471264368,10.355987055,10.46728972,10.777385159,8.1814139618,12.493307157,10.042141128,12.461621817,11.954356095,12.801755669,9.0114942529,11.650485437,12.710280374,-2.473498233,-0.355713651,-1.606282349,-0.358647897,-3.070254651,0.362253215,-2.743233358,0.7356321839,-1.294498382,-2.242990654,-0.176678445,-0.177856825,0.3569516331,0.5379718461,0.1806032147,1.2678862525,0.9144111192,1.1034482759,0.7397133611,0.5607476636,1.5901060071,-11.73855047,6.6036052115,-15.06321169,3.43146108,-7.96957073,-11.33869788,0,-12.20527046,-6.728971963,1.4134275618,-11.91640729,6.9605568445,-14.52523985,3.6120642947,-6.701684477,-10.42428676,1.1034482759,-11.4655571,-6.168224299 +050,2,4,20,139,Kansas,Osage County,16295,16294,16274,16342,16179,16084,15973,15867,15836,15842,15921,15906,15770,-20,68,-163,-95,-111,-106,-31,6,79,-15,-136,46,183,157,157,170,156,191,156,160,170,166,55,166,171,188,194,215,199,182,204,191,230,-9,17,-14,-31,-24,-59,-8,-26,-44,-21,-64,0,2,5,2,4,5,4,0,0,-1,0,-10,50,-157,-64,-91,-52,-27,34,124,6,-72,-10,52,-152,-62,-87,-47,-23,34,124,5,-72,-1,-1,3,-2,0,0,0,-2,-1,1,0,194,194,194,194,194,194,194,194,194,194,194,194,11.221486387,9.6552996525,9.7325109258,10.60610787,9.7989949749,12.049332871,9.8491066355,10.074615118,10.682753637,10.481121354,10.179053225,10.516281787,11.654216905,12.103440746,13.505025126,12.55401697,11.490624408,12.845134276,12.00238791,14.522035611,1.0424331616,-0.860982135,-1.921705979,-1.497332876,-3.706030151,-0.504684099,-1.641517773,-2.770519158,-1.319634273,-4.040914257,0.1226391955,0.3074936195,0.1239810309,0.2495554793,0.3140703518,0.2523420496,0,0,-0.062839727,0,3.0659798872,-9.655299653,-3.967392989,-5.677387154,-3.266331658,-1.703308835,2.1466001642,7.8078267166,0.3770383637,-4.546028539,3.1886190827,-9.347806033,-3.843411958,-5.427831675,-2.952261307,-1.450966785,2.1466001642,7.8078267166,0.3141986364,-4.546028539 +050,2,4,20,141,Kansas,Osborne County,3858,3861,3850,3833,3810,3800,3752,3641,3598,3539,3456,3438,3439,-11,-17,-23,-10,-48,-111,-43,-59,-83,-18,1,12,38,41,42,53,39,56,34,41,44,41,6,53,57,67,60,75,72,58,63,36,40,6,-15,-16,-25,-7,-36,-16,-24,-22,8,1,0,3,3,7,4,3,3,1,0,0,1,-18,-5,-9,7,-43,-79,-29,-35,-60,-27,0,-18,-2,-6,14,-39,-76,-26,-34,-60,-27,1,1,0,-1,1,-2,1,-1,-1,-1,1,-1,100,100,100,100,100,100,100,100,100,100,100,100,9.8919692828,10.728771425,11.038107753,14.036016949,10.550520763,15.471750242,9.5278128065,11.722659042,12.764722947,11.923803984,13.796694,14.915609054,17.608409987,15.889830508,20.289463006,19.892250311,16.253327729,18.012866333,10.44386423,11.632979497,-3.904724717,-4.186837629,-6.570302234,-1.853813559,-9.738942243,-4.420500069,-6.725514922,-6.290207291,2.3208587177,0.2908244874,0.7809449434,0.7850320555,1.8396846255,1.0593220339,0.8115785202,0.828843763,0.2802297884,0,0,0.2908244874,-1.301574906,-2.355096166,1.8396846255,-11.38771186,-21.3715677,-8.012156375,-9.808042595,-17.15511079,-7.832898172,0,-0.520629962,-1.570064111,3.679369251,-10.32838983,-20.55998918,-7.183312612,-9.527812807,-17.15511079,-7.832898172,0.2908244874 +050,2,4,20,143,Kansas,Ottawa County,6091,6091,6097,6063,6027,6040,6027,5932,5898,5813,5744,5713,5712,6,-34,-36,13,-13,-95,-34,-85,-69,-31,-1,20,67,52,62,49,64,56,51,50,60,59,6,76,85,56,55,71,85,72,81,50,66,14,-9,-33,6,-6,-7,-29,-21,-31,10,-7,0,2,0,3,4,1,2,0,0,0,0,-8,-26,-4,5,-10,-90,-7,-62,-39,-41,7,-8,-24,-4,8,-6,-89,-5,-62,-39,-41,7,0,-1,1,-1,-1,1,0,-2,1,0,-1,98,98,98,98,98,98,98,98,98,98,98,98,11.019736842,8.6021505376,10.275959228,8.1213226154,10.703236057,9.4674556213,8.7097600546,8.6527645583,10.473946059,10.328227571,12.5,14.06120761,9.2815115605,9.1157702826,11.8739025,14.370245139,12.296131842,14.017478584,8.7282883826,11.553610503,-1.480263158,-5.459057072,0.9944476672,-0.994447667,-1.170666444,-4.902789518,-3.586371787,-5.364714026,1.7456576765,-1.225382932,0.3289473684,0,0.4972238336,0.6629651115,0.1672380634,0.338123415,0,0,0,0,-4.276315789,-0.661703888,0.8287063893,-1.657412779,-15.0514257,-1.183431953,-10.58833575,-6.749156355,-7.157196474,1.2253829322,-3.947368421,-0.661703888,1.3259302229,-0.994447667,-14.88418764,-0.845308538,-10.58833575,-6.749156355,-7.157196474,1.2253829322 +050,2,4,20,145,Kansas,Pawnee County,6973,6971,6979,6977,6865,6863,6823,6772,6716,6673,6554,6384,6366,8,-2,-112,-2,-40,-51,-56,-43,-119,-170,-18,14,70,75,58,61,69,59,85,63,50,51,4,87,77,69,85,83,83,85,102,68,81,10,-17,-2,-11,-24,-14,-24,0,-39,-18,-30,0,-1,-1,-1,-2,-3,0,-1,-2,-2,0,-1,16,-111,11,-12,-34,-32,-42,-78,-150,11,-1,15,-112,10,-14,-37,-32,-43,-80,-152,11,-1,0,2,-1,-2,0,0,0,0,0,1,1026,1026,1026,1026,1027,1026,1024,1023,1026,1025,1024,1023,10.031527658,10.836584309,8.4498834499,8.9142189098,10.150790732,8.7485172005,12.696990066,9.5259696076,7.7291698872,8,12.467755804,11.12555989,10.052447552,12.421452579,12.21037146,12.307236062,12.696990066,15.422998412,10.511671047,12.705882353,-2.436228146,-0.288975582,-1.602564103,-3.507233669,-2.059580728,-3.558718861,0,-5.897028805,-2.782501159,-4.705882353,-0.143307538,-0.144487791,-0.145687646,-0.292269472,-0.441338727,0,-0.149376354,-0.302411734,-0.309166795,0,2.2929206076,-16.03814478,1.6025641026,-1.753616835,-5.001838911,-4.744958482,-6.273806856,-11.79405761,-23.18750966,1.7254901961,2.1496130696,-16.18263257,1.4568764569,-2.045886307,-5.443177639,-4.744958482,-6.42318321,-12.09646934,-23.49667646,1.7254901961 +050,2,4,20,147,Kansas,Phillips County,5642,5640,5632,5540,5520,5559,5494,5419,5402,5379,5274,5248,5181,-8,-92,-20,39,-65,-75,-17,-23,-105,-26,-67,7,62,59,71,70,64,55,54,50,70,61,10,93,69,63,82,65,78,73,71,67,66,-3,-31,-10,8,-12,-1,-23,-19,-21,3,-5,0,1,1,0,1,4,5,1,2,1,1,-5,-62,-11,30,-54,-77,1,-6,-86,-31,-62,-5,-61,-10,30,-53,-73,6,-5,-84,-30,-61,0,0,0,1,0,-1,0,1,0,1,-1,68,68,68,68,68,68,68,68,68,68,68,68,11.099176513,10.669077758,12.817041249,12.666244459,11.729130395,10.165419093,10.017623597,9.3870271285,13.305455237,11.698149391,16.648764769,12.477396022,11.372867587,14.837600651,11.912398057,14.416412531,13.542343011,13.329578522,12.735221441,12.657014095,-5.549588256,-1.808318264,1.4441736619,-2.171356193,-0.183267662,-4.250993439,-3.524719414,-3.942551394,0.5702337959,-0.958864704,0.179018976,0.1808318264,0,0.1809463494,0.7330706497,0.9241290084,0.1855115481,0.3754810851,0.190077932,0.1917729408,-11.09917651,-1.98915009,5.4156512321,-9.771102868,-14.11161001,0.1848258017,-1.113069289,-16.14568666,-5.892415891,-11.88992233,-10.92015754,-1.808318264,5.4156512321,-9.590156519,-13.37853936,1.1089548101,-0.92755774,-15.77020558,-5.702337959,-11.69814939 +050,2,4,20,149,Kansas,Pottawatomie County,21604,21608,21729,22033,22339,22586,22755,23145,23646,23938,24243,24468,24722,121,304,306,247,169,390,501,292,305,225,254,87,380,357,350,358,344,396,358,385,365,371,15,139,164,174,190,186,186,193,178,165,210,72,241,193,176,168,158,210,165,207,200,161,4,28,21,7,8,22,13,3,5,1,3,43,37,95,66,-3,211,278,124,96,24,88,47,65,116,73,5,233,291,127,101,25,91,2,-2,-3,-2,-4,-1,0,0,-3,0,2,299,299,299,299,299,299,299,299,299,299,299,299,17.366665143,16.091228703,15.581524763,15.791447035,14.989106754,16.926331987,15.047074647,15.981403458,14.986348053,15.084366741,6.3525433024,7.3920490399,7.7462437396,8.3809355771,8.1045751634,7.9502468423,8.1119704102,7.3888047156,6.7746504896,8.5383207969,11.014121841,8.6991796629,7.8352810239,7.4105114576,6.8845315904,8.9760851446,6.9351042367,8.5925987422,8.2116975632,6.5460459443,1.2796490106,0.9465428649,0.3116304953,0.352881498,0.9586056645,0.5556624137,0.1260928043,0.2075506943,0.0410584878,0.1219760114,1.690964764,4.2819796268,2.938230384,-0.132330562,9.1938997821,11.882627001,5.2118359112,3.9849733297,0.9854037076,3.5779630006,2.9706137745,5.2285224917,3.2498608792,0.2205509362,10.152505447,12.438289415,5.3379287155,4.192524024,1.0264621954,3.699939012 +050,2,4,20,151,Kansas,Pratt County,9656,9653,9641,9644,9760,9780,9769,9695,9558,9493,9326,9114,9127,-12,3,116,20,-11,-74,-137,-65,-167,-212,13,27,138,143,147,132,140,143,107,117,107,111,17,129,109,138,128,110,126,108,117,117,91,10,9,34,9,4,30,17,-1,0,-10,20,0,4,2,4,14,9,6,2,4,1,3,-22,-9,79,7,-27,-113,-160,-66,-172,-202,-9,-22,-5,81,11,-13,-104,-154,-64,-168,-201,-6,0,-1,1,0,-2,0,0,0,1,-1,-1,380,380,380,380,380,380,380,380,380,381,381,381,14.311641172,14.739229025,15.046059365,13.504527086,14.385532265,14.854827819,11.233006141,12.434241989,11.605206074,12.170385396,13.378273269,11.234796949,14.124872057,13.095298992,11.302918208,13.088869267,11.337987507,12.434241989,12.689804772,9.9775231621,0.9333679025,3.5044320759,0.9211873081,0.4092280935,3.0826140567,1.7659585519,-0.104981366,0,-1.084598698,2.1928622334,0.4148301789,0.2061430633,0.4094165814,1.4322983273,0.924784217,0.6232794889,0.2099627316,0.4251022902,0.1084598698,0.328929335,-0.933367903,8.1426509998,0.7164790174,-2.762289631,-11.61117961,-16.62078637,-6.928770143,-18.27939848,-21.90889371,-0.986788005,-0.518537724,8.3487940631,1.1258955988,-1.329991304,-10.6863954,-15.99750688,-6.718807412,-17.85429619,-21.80043384,-0.65785867 +050,2,4,20,153,Kansas,Rawlins County,2519,2519,2496,2508,2509,2563,2543,2504,2494,2471,2483,2493,2511,-23,12,1,54,-20,-39,-10,-23,12,10,18,6,18,24,29,23,34,29,32,42,33,37,20,30,30,43,43,40,43,43,38,31,23,-14,-12,-6,-14,-20,-6,-14,-11,4,2,14,0,2,4,3,6,3,4,2,3,4,3,-9,21,4,64,-6,-35,0,-14,4,5,1,-9,23,8,67,0,-32,4,-12,7,9,4,0,1,-1,1,0,-1,0,0,1,-1,0,40,40,40,40,40,40,40,40,40,40,40,40,7.1942446043,9.5674706,11.43533123,9.009009009,13.473350505,11.604641857,12.890231621,16.955995155,13.263665595,14.788169464,11.990407674,11.95933825,16.955835962,16.842929886,15.851000594,17.206882753,17.321248741,15.341138474,12.459807074,9.1926458833,-4.79616307,-2.39186765,-5.520504732,-7.833920877,-2.377650089,-5.602240896,-4.43101712,1.6148566815,0.8038585209,5.5955235811,0.7993605116,1.5945784333,1.1829652997,2.3501762632,1.1888250446,1.6006402561,0.8056394763,1.2111425111,1.6077170418,1.1990407674,8.3932853717,1.5945784333,25.23659306,-2.350176263,-13.86962552,0,-5.639476334,1.6148566815,2.0096463023,0.3996802558,9.1926458833,3.1891568667,26.41955836,0,-12.68080048,1.6006402561,-4.833836858,2.8259991926,3.6173633441,1.5987210232 +050,2,4,20,155,Kansas,Reno County,64511,64511,64552,64432,64210,64090,63716,63612,63230,62756,62363,61963,61793,41,-120,-222,-120,-374,-104,-382,-474,-393,-400,-170,200,720,771,750,729,710,691,731,644,623,620,199,709,754,761,789,739,746,728,773,687,749,1,11,17,-11,-60,-29,-55,3,-129,-64,-129,3,1,-9,0,28,74,82,26,43,30,19,44,-130,-227,-99,-339,-143,-409,-502,-306,-368,-59,47,-129,-236,-99,-311,-69,-327,-476,-263,-338,-40,-7,-2,-3,-10,-3,-6,0,-1,-1,2,-1,3129,3129,3129,3125,3121,3119,3116,3113,3109,3112,3113,3113,11.164175402,11.986753937,11.691348402,11.407915121,11.152299573,10.895444727,11.604463988,10.294199922,10.022038833,10.019716216,10.993611611,11.722454564,11.862821512,12.346838177,11.607816034,11.762665363,11.556839649,12.356236863,11.051590174,12.104463622,0.1705637909,0.2642993735,-0.17147311,-0.938923055,-0.455516461,-0.867220637,0.0476243392,-2.062036941,-1.029551341,-2.084747406,0.0155057992,-0.139923198,0,0.4381640925,1.1623523498,1.2929471311,0.4127442732,0.6873456469,0.482602191,0.3070558195,-2.015753892,-3.529173987,-1.543257989,-5.304915262,-2.246167379,-6.448968007,-7.969139428,-4.891343441,-5.91992021,-0.953489124,-2.000248093,-3.669097184,-1.543257989,-4.86675117,-1.083815029,-5.156020876,-7.556395155,-4.203997794,-5.437318019,-0.646433304 +050,2,4,20,157,Kansas,Republic County,4980,4980,4938,4892,4826,4767,4741,4688,4660,4655,4623,4563,4536,-42,-46,-66,-59,-26,-53,-28,-5,-32,-60,-27,3,47,41,50,53,48,48,47,55,44,41,30,93,94,80,101,95,66,106,84,66,65,-27,-46,-53,-30,-48,-47,-18,-59,-29,-22,-24,0,0,2,2,8,7,5,2,2,3,4,-14,0,-14,-31,14,-14,-15,53,-5,-41,-8,-14,0,-12,-29,22,-7,-10,55,-3,-38,-4,-1,0,-1,0,0,1,0,-1,0,0,1,103,103,103,103,103,103,103,103,103,103,103,103,9.5625635809,8.4379501955,10.424267695,11.148506521,10.181355393,10.26957638,10.091250671,11.856003449,9.5797953407,9.0119793384,18.921668362,19.345544351,16.678828312,21.245267143,20.150599215,14.120667522,22.758990875,18.107350722,14.369693011,14.287284317,-9.359104781,-10.90759416,-6.254560617,-10.09676062,-9.969243822,-3.851091142,-12.6677402,-6.251347273,-4.78989767,-5.275304979,0,0.4116073266,0.4169707078,1.6827934371,1.4847809948,1.0697475396,0.4294149222,0.4311273981,0.6531678641,0.8792174964,0,-2.881251286,-6.463045971,2.9448885149,-2.96956199,-3.209242619,11.379495437,-1.077818495,-8.926627477,-1.758434993,0,-2.46964396,-6.046075263,4.627681952,-1.484780995,-2.139495079,11.80891036,-0.646691097,-8.273459612,-0.879217496 +050,2,4,20,159,Kansas,Rice County,10083,10082,10116,10096,9988,9974,9972,9926,9773,9559,9453,9512,9362,34,-20,-108,-14,-2,-46,-153,-214,-106,59,-150,30,123,110,121,128,133,116,114,105,111,108,13,124,133,130,146,114,119,133,131,94,98,17,-1,-23,-9,-18,19,-3,-19,-26,17,10,1,8,11,17,14,13,5,4,5,4,3,17,-26,-99,-20,3,-79,-155,-199,-85,39,-162,18,-18,-88,-3,17,-66,-150,-195,-80,43,-159,-1,-1,3,-2,-1,1,0,0,0,-1,-1,648,648,648,648,648,648,648,649,651,651,651,651,12.170987532,10.953993228,12.123033764,12.834653565,13.368177706,11.777247576,11.793916822,11.045655376,11.705773794,11.444314931,12.26993865,13.244373631,13.024747019,14.639526722,11.458438034,12.081831565,13.759569625,13.78077004,9.9129976272,10.384656141,-0.098951118,-2.290380402,-0.901713255,-1.804873158,1.9097396723,-0.304583989,-1.965652804,-2.735114664,1.7927761666,1.0596587899,0.7916089452,1.0953993228,1.7032361487,1.4037902336,1.3066639863,0.5076399817,0.4138216429,0.5259835893,0.4218296863,0.317897637,-2.572729072,-9.858593906,-2.003807234,0.3008121929,-7.940496532,-15.73683943,-20.58762673,-8.941721018,4.1128394411,-17.1664724,-1.781120127,-8.763194583,-0.300571085,1.7046024266,-6.633832546,-15.22919945,-20.17380509,-8.415737429,4.5346691273,-16.84857476 +050,2,4,20,161,Kansas,Riley County,71115,71134,71557,73449,77545,76996,76570,77293,75374,74129,74826,72762,73202,423,1892,4096,-549,-426,723,-1919,-1245,697,-2064,440,282,1103,1140,1094,1075,1011,1033,936,870,870,852,91,334,322,302,319,353,354,381,414,365,389,191,769,818,792,756,658,679,555,456,505,463,169,534,1160,714,770,1180,848,274,282,255,203,57,579,1989,-2086,-1993,-1129,-3469,-2092,-41,-2829,-230,226,1113,3149,-1372,-1223,51,-2621,-1818,241,-2574,-27,6,10,129,31,41,14,23,18,0,5,4,9143,9132,9161,10438,10457,10703,10432,10254,9674,10662,9231,9232,15.213163593,15.099937746,14.158055144,14.000494901,13.141560999,13.532721544,12.521487863,11.681380283,11.789576388,11.674111425,4.6067059294,4.2650701352,3.9083479465,4.1545654637,4.5884975595,4.6375444595,5.0968876879,5.5587257897,4.9462015882,5.3300813899,10.606457664,10.834867611,10.249707197,9.8459294375,8.5530634396,8.8951770848,7.4246001752,6.122654493,6.8433748001,6.3440300348,7.365212474,15.364848934,9.2402663371,10.028261464,15.338320454,11.10914605,3.6654782847,3.7863784364,3.4555654931,2.781507769,7.9858764465,26.345417699,-26.99607224,-25.95626636,-14.67539304,-45.44531562,-27.98606048,-0.550501829,-38.33645012,-3.151462004,15.35108892,41.710266633,-17.7558059,-15.9280049,0.6629274094,-34.33616957,-24.3205822,3.235876607,-34.88088462,-0.369954235 +050,2,4,20,163,Kansas,Rooks County,5181,5181,5196,5201,5221,5195,5203,5179,5118,5055,4989,4937,4827,15,5,20,-26,8,-24,-61,-63,-66,-52,-110,23,59,63,60,70,48,63,63,60,66,64,5,68,57,67,63,67,67,62,75,68,82,18,-9,6,-7,7,-19,-4,1,-15,-2,-18,0,2,1,3,2,2,0,0,0,0,0,-2,12,13,-23,0,-6,-56,-64,-51,-50,-90,-2,14,14,-20,2,-4,-56,-64,-51,-50,-90,-1,0,0,1,-1,-1,-1,0,0,0,-2,72,72,72,72,72,72,72,72,72,72,72,72,11.34942772,12.089810017,11.520737327,13.464127717,9.2467732614,12.236573759,12.385726924,11.947431302,13.298408221,13.109381401,13.080696355,10.938399539,12.864823349,12.117714945,12.906954344,13.013499077,12.189128084,14.934289128,13.701390288,16.79639492,-1.731268635,1.1514104778,-1.344086022,1.3464127717,-3.660181083,-0.776925318,0.1965988401,-2.986857826,-0.402982067,-3.687013519,0.3847263634,0.1919017463,0.5760368664,0.3846893633,0.3852822192,0,0,0,0,0,2.3083581802,2.494722702,-4.416282642,0,-1.155846658,-10.87695445,-12.58232576,-10.15531661,-10.07455168,-18.4350676,2.6930845436,2.6866244483,-3.840245776,0.3846893633,-0.770564438,-10.87695445,-12.58232576,-10.15531661,-10.07455168,-18.4350676 +050,2,4,20,165,Kansas,Rush County,3307,3307,3314,3211,3208,3175,3160,3097,3052,3049,3037,2994,2947,7,-103,-3,-33,-15,-63,-45,-3,-12,-43,-47,8,26,28,26,26,30,36,44,23,20,21,20,48,52,47,56,44,65,65,58,47,29,-12,-22,-24,-21,-30,-14,-29,-21,-35,-27,-8,1,1,1,0,0,0,0,0,0,0,0,16,-81,21,-11,15,-49,-16,19,22,-16,-38,17,-80,22,-11,15,-49,-16,19,22,-16,-38,2,-1,-1,-1,0,0,0,-1,1,0,-1,67,67,67,67,67,67,66,66,66,66,66,66,7.969348659,8.7241003272,8.1466395112,8.2083662194,9.5892600288,11.709221012,14.42386494,7.5583305948,6.6323992704,7.0695169163,14.712643678,16.201900608,14.726617578,17.679558011,14.064248042,21.141649049,21.307982298,19.060138022,15.586138286,9.7626662178,-6.743295019,-7.47780028,-6.579978067,-9.471191792,-4.474988013,-9.432428037,-6.884117358,-11.50180743,-8.953739015,-2.693149301,0.30651341,0.3115750117,0,0,0,0,0,0,0,0,-24.82758621,6.5430752454,-3.446655178,4.7355958958,-15.66245805,-5.204098227,6.2284871333,7.2297075255,-5.305919416,-12.79245918,-24.5210728,6.854650257,-3.446655178,4.7355958958,-15.66245805,-5.204098227,6.2284871333,7.2297075255,-5.305919416,-12.79245918 +050,2,4,20,167,Kansas,Russell County,6970,6967,7000,6985,6989,6977,7008,7045,6997,6928,6885,6868,6804,33,-15,4,-12,31,37,-48,-69,-43,-17,-64,29,82,86,88,79,92,68,85,71,89,81,14,105,91,89,91,89,70,95,117,80,98,15,-23,-5,-1,-12,3,-2,-10,-46,9,-17,0,0,-1,-3,-4,-5,-7,-8,-8,-9,-6,17,7,11,-7,47,41,-38,-51,11,-18,-41,17,7,10,-10,43,36,-45,-59,3,-27,-47,1,1,-1,-1,0,-2,-1,0,0,1,0,89,89,89,89,89,89,89,89,89,89,89,89,11.726850197,12.308573064,12.60203351,11.297819092,13.093289689,9.6852300242,12.208258528,10.280170854,12.942630699,11.849034523,15.016088666,13.024187777,12.745238436,13.013943511,12.66633459,9.9700897308,13.644524237,16.940563238,11.633825347,14.335868929,-3.28923847,-0.715614713,-0.143204926,-1.716124419,0.4269550986,-0.284859707,-1.436265709,-6.660392384,1.3088053516,-2.486834406,0,-0.143122943,-0.429614779,-0.572041473,-0.711591831,-0.997008973,-1.149012567,-1.15832911,-1.308805352,-0.877706261,1.0010725778,1.5743523687,-1.002434484,6.7214873078,5.8350530136,-5.412334425,-7.324955117,1.5927025266,-2.617610703,-5.99765945,1.0010725778,1.4312294261,-1.432049262,6.1494458348,5.1234611827,-6.409343398,-8.473967684,0.4343734163,-3.926416055,-6.875365711 +050,2,4,20,169,Kansas,Saline County,55606,55604,55781,55785,55841,55765,55540,55463,54975,54529,54351,54140,53926,177,4,56,-76,-225,-77,-488,-446,-178,-211,-214,205,789,773,772,743,766,687,697,661,637,627,89,553,532,530,575,526,538,550,611,508,526,116,236,241,242,168,240,149,147,50,129,101,21,36,31,42,33,19,18,-17,-2,-6,2,46,-268,-211,-356,-426,-333,-657,-576,-225,-334,-317,67,-232,-180,-314,-393,-314,-639,-593,-227,-340,-315,-6,0,-5,-4,0,-3,2,0,-1,0,0,1465,1465,1465,1465,1465,1465,1465,1466,1469,1471,1470,1470,14.144094079,13.849819934,13.834381664,13.350703023,13.80142879,12.441369818,12.73012858,12.141807494,11.74290955,11.604019766,9.9134144811,9.5318295021,9.4976972564,10.331970711,9.4772213364,9.7430232348,10.045295149,11.223365173,9.3648321059,9.7347917014,4.2306795977,4.3179904323,4.3366844076,3.0187323121,4.3242074539,2.6983465836,2.6848334307,0.9184423218,2.3780774442,1.8692280643,0.6453579047,0.5554261552,0.7526477071,0.5929652756,0.3423330901,0.3259747551,-0.310490941,-0.036737693,-0.110608253,0.0370144171,-4.804331069,-3.78048125,-6.379585327,-7.654642649,-5.999837842,-11.89807856,-10.52016365,-4.132990448,-6.157192763,-5.866785113,-4.158973164,-3.225055095,-5.62693762,-7.061677373,-5.657504752,-11.5721038,-10.83065459,-4.169728141,-6.267801016,-5.829770696 +050,2,4,20,171,Kansas,Scott County,4936,4936,4959,4892,4856,4908,4968,4950,4976,4931,4918,4850,4790,23,-67,-36,52,60,-18,26,-45,-13,-68,-60,12,62,66,58,77,64,51,55,70,62,66,14,66,60,59,51,35,49,55,47,51,63,-2,-4,6,-1,26,29,2,0,23,11,3,11,17,-3,2,0,0,2,-4,-4,-4,-3,14,-79,-40,51,35,-46,21,-40,-33,-74,-61,25,-62,-43,53,35,-46,23,-44,-37,-78,-64,0,-1,1,0,-1,-1,1,-1,1,-1,1,105,105,105,105,105,105,105,105,105,105,105,105,12.587554563,13.541239229,11.880376895,15.593357635,12.905827788,10.276042716,11.103260321,14.21464108,12.694512695,13.692946058,13.399654857,12.310217481,12.085210979,10.328068044,7.0578745715,9.8730606488,11.103260321,9.5441161539,10.442260442,13.070539419,-0.812100294,1.2310217481,-0.204834084,5.2652895909,5.8479532164,0.4029820673,0,4.6705249264,2.2522522523,0.622406639,3.4514262511,-0.615510874,0.4096681688,0,0,0.4029820673,-0.807509842,-0.812265205,-0.819000819,-0.622406639,-16.03898081,-8.206811654,10.446538304,7.0878898339,-9.276063723,4.2313117066,-8.075098415,-6.701187938,-15.15151515,-12.65560166,-12.58755456,-8.822322528,10.856206473,7.0878898339,-9.276063723,4.6342937739,-8.882608257,-7.513453142,-15.97051597,-13.2780083 +050,2,4,20,173,Kansas,Sedgwick County,498365,498356,499138,501051,504171,506542,509084,511230,513324,513392,513877,516579,519907,782,1913,3120,2371,2542,2146,2094,68,485,2702,3328,2024,7969,7740,7802,7454,7259,7358,7093,6796,6740,6669,1023,4057,4003,4149,4176,4485,4474,4500,4626,4555,4863,1001,3912,3737,3653,3278,2774,2884,2593,2170,2185,1806,136,858,1077,1050,1144,1529,1247,360,714,518,415,-327,-2861,-1629,-2309,-1831,-2125,-2022,-2875,-2399,-15,1075,-191,-2003,-552,-1259,-687,-596,-775,-2515,-1685,503,1490,-28,4,-65,-23,-49,-32,-15,-10,0,14,32,7252,7252,7292,7303,7297,7297,7287,7262,7246,7240,7237,7238,15.934988287,15.399583376,15.438606212,14.678631701,14.228953048,14.363322968,13.81686854,13.231198449,13.081587181,12.868480616,8.1124667438,7.9644098518,8.2100457796,8.2234995953,8.7914112714,8.7335562596,8.7658125519,9.0064043595,8.8407462327,9.3836289154,7.8225215434,7.4351735239,7.2285604321,6.4551321057,5.4375417764,5.6297667082,5.0510559882,4.22479409,4.2408409481,3.4848517008,1.7156757373,2.1428102449,2.077741159,2.2527977819,2.9971165739,2.4342299186,0.7012650041,1.3900935393,1.0053801424,0.8007826444,-5.720918746,-3.241075106,-4.569051749,-3.605657988,-4.165384382,-3.947083316,-5.600380241,-4.670636416,-0.029113325,2.0743164886,-4.005243009,-1.098264861,-2.49131059,-1.352860206,-1.168267808,-1.512853398,-4.899115237,-3.280542876,0.9762668178,2.875099133 +050,2,4,20,175,Kansas,Seward County,22952,22950,22972,23131,23358,23318,23308,23283,22907,22239,21904,21421,21038,22,159,227,-40,-10,-25,-376,-668,-335,-483,-383,117,449,474,426,449,444,429,434,399,371,363,54,130,128,112,151,132,132,129,134,108,115,63,319,346,314,298,312,297,305,265,263,248,15,14,78,63,135,211,177,45,89,73,55,-57,-175,-197,-423,-453,-557,-853,-1023,-693,-818,-680,-42,-161,-119,-360,-318,-346,-676,-978,-604,-745,-625,1,1,0,6,10,9,3,5,4,-1,-6,476,476,476,476,476,476,476,476,476,476,476,476,19.478125068,20.391920669,18.253492159,19.259640544,19.059475006,18.575449231,19.226509547,18.077611399,17.126370456,17.098848301,5.6395462334,5.5066789993,4.799040192,6.4770728778,5.6663304072,5.7155228404,5.7147920082,6.0711777632,4.9855741489,5.4169905085,13.838578834,14.88524167,13.454451967,12.782567666,13.393144599,12.859926391,13.511717539,12.006433636,12.140796307,11.681857792,0.6073357482,3.3556325152,2.699460108,5.7907605199,9.0575433024,7.663996536,1.9935320959,4.0323494099,3.3698788229,2.590734591,-7.591696853,-8.475123147,-18.12494644,-19.43121863,-23.91019725,-36.93440139,-45.31962965,-31.39795664,-37.76110791,-32.0309004,-6.984361104,-5.119490632,-15.42548633,-13.64045811,-14.85265395,-29.27040485,-43.32609755,-27.36560723,-34.39122908,-29.44016581 +050,2,4,20,177,Kansas,Shawnee County,177934,177943,178365,178968,179013,178714,178651,178789,178413,178096,177224,176735,175999,422,603,45,-299,-63,138,-376,-317,-872,-489,-736,672,2497,2404,2432,2397,2273,2219,2177,2091,2085,2081,318,1673,1742,1787,1773,1933,1815,1926,1949,1969,1946,354,824,662,645,624,340,404,251,142,116,135,20,115,149,174,271,338,238,42,121,96,77,68,-330,-753,-1125,-949,-525,-1014,-604,-1136,-702,-949,88,-215,-604,-951,-678,-187,-776,-562,-1015,-606,-872,-20,-6,-13,7,-9,-15,-4,-6,1,1,1,4397,4397,4400,4397,4398,4396,4398,4392,4389,4389,4386,4389,13.975759306,13.43088041,13.596960811,13.41485596,12.718218442,12.424342529,12.212875411,11.769672408,11.781025486,11.799259499,9.3638147051,9.7323600973,9.9908589511,9.9226281253,10.815801253,10.16231712,10.804776317,10.970392885,11.125582341,11.03381018,4.6119446007,3.6985203125,3.6061018598,3.4922278343,1.9024171889,2.2620254086,1.4080990943,0.7992795227,0.6554431445,0.7654493188,0.6436573168,0.8324464148,0.9728088738,1.5166566396,1.8912264996,1.3325793249,0.2356181751,0.681076213,0.5424357058,0.4365896114,-1.847016648,-4.206927183,-6.289712546,-5.311096498,-2.937555953,-5.677459813,-3.388413757,-6.394236181,-3.966561099,-5.380825211,-1.203359331,-3.374480769,-5.316903672,-3.794439858,-1.046329454,-4.344880488,-3.152795582,-5.713159968,-3.424125393,-4.9442356 +050,2,4,20,179,Kansas,Sheridan County,2556,2544,2530,2501,2490,2499,2501,2474,2489,2526,2521,2517,2520,-14,-29,-11,9,2,-27,15,37,-5,-4,3,4,25,26,30,27,27,33,29,24,24,23,13,42,20,35,28,31,29,31,28,22,20,-9,-17,6,-5,-1,-4,4,-2,-4,2,3,0,0,-1,2,0,3,4,1,3,1,1,-6,-11,-15,11,4,-26,8,38,-3,-8,0,-6,-11,-16,13,4,-23,12,39,0,-7,1,1,-1,-1,1,-1,0,-1,0,-1,1,-1,33,33,33,33,33,33,33,33,33,33,33,33,9.9383820314,10.418753757,12.026458208,10.8,10.854271357,13.298408221,11.565304088,9.5106003566,9.5275903136,9.1324200913,16.696481813,8.0144259667,14.030867909,11.2,12.462311558,11.686479952,12.362911266,11.095700416,8.7336244541,7.941234862,-6.758099781,2.40432779,-2.004409701,-0.4,-1.608040201,1.6119282692,-0.797607178,-1.585100059,0.7939658595,1.1911852293,0,-0.400721298,0.8017638805,0,1.2060301508,1.6119282692,0.3988035892,1.1888250446,0.3969829297,0.3970617431,-4.372888094,-6.010819475,4.409701343,1.6,-10.45226131,3.2238565384,15.154536391,-1.188825045,-3.175863438,0,-4.372888094,-6.411540773,5.2114652235,1.6,-9.246231156,4.8357848076,15.55333998,0,-2.778880508,0.3970617431 +050,2,4,20,181,Kansas,Sherman County,6010,6010,6018,6055,6122,6094,6069,5965,5960,5935,5915,5932,5777,8,37,67,-28,-25,-104,-5,-25,-20,17,-155,20,78,76,86,83,74,84,64,74,64,65,8,71,75,72,81,68,68,79,54,66,77,12,7,1,14,2,6,16,-15,20,-2,-12,1,-1,-3,-2,-4,0,-2,-3,-3,-3,-3,-4,30,67,-41,-22,-111,-20,-5,-38,24,-139,-3,29,64,-43,-26,-111,-22,-8,-41,21,-142,-1,1,2,1,-1,1,1,-2,1,-2,-1,102,102,102,102,102,102,102,102,102,102,102,102,12.921394848,12.482549068,14.079895219,13.647948697,12.298487618,14.088050314,10.760823876,12.489451477,10.804423061,11.102570672,11.76178249,12.318305001,11.787819253,13.319082463,11.301312947,11.404612159,13.282891971,9.1139240506,11.142061281,13.152276027,1.1596123582,0.1642440667,2.2920759659,0.3288662337,0.9971746718,2.6834381551,-2.522068096,3.3755274262,-0.337638221,-2.049705355,-0.165658908,-0.4927322,-0.327439424,-0.657732467,0,-0.335429769,-0.504413619,-0.506329114,-0.506457331,-0.512426339,4.9697672492,11.004352468,-6.712508186,-3.61752857,-18.44773143,-3.354297694,-0.840689365,-6.41350211,4.0516586478,-23.74242036,4.8041083409,10.511620268,-7.03994761,-4.275261038,-18.44773143,-3.689727463,-1.345102984,-6.919831224,3.5452013168,-24.2548467 +050,2,4,20,183,Kansas,Smith County,3853,3853,3860,3791,3754,3700,3730,3691,3657,3616,3582,3571,3544,7,-69,-37,-54,30,-39,-34,-41,-34,-11,-27,7,33,32,32,26,39,46,40,40,29,26,8,56,60,72,72,66,58,69,50,43,41,-1,-23,-28,-40,-46,-27,-12,-29,-10,-14,-15,0,0,0,0,0,0,0,0,0,0,0,9,-46,-8,-14,75,-14,-21,-10,-24,3,-11,9,-46,-8,-14,75,-14,-21,-10,-24,3,-11,-1,0,-1,0,1,2,-1,-2,0,0,-1,56,56,56,56,56,56,56,56,56,56,56,56,8.6263233564,8.4824387011,8.5859940971,6.998654105,10.510712842,12.520413718,10.999587515,11.114198388,8.10848595,7.3085031623,14.638609332,15.904572565,19.318486719,19.380888291,17.787360194,15.786608601,18.974288464,13.892747986,12.022927443,11.524947294,-6.012285976,-7.422133863,-10.73249262,-12.38223419,-7.276647352,-3.266194883,-7.974700949,-2.778549597,-3.914441493,-4.216444132,0,0,0,0,0,0,0,0,0,0,-12.02457195,-2.120609675,-3.756372417,20.188425303,-3.773076405,-5.715841045,-2.749896879,-6.668519033,0.8388088914,-3.09205903,-12.02457195,-2.120609675,-3.756372417,20.188425303,-3.773076405,-5.715841045,-2.749896879,-6.668519033,0.8388088914,-3.09205903 +050,2,4,20,185,Kansas,Stafford County,4437,4439,4429,4383,4350,4340,4282,4217,4194,4187,4119,4081,4046,-10,-46,-33,-10,-58,-65,-23,-7,-68,-38,-35,8,51,43,38,53,49,61,50,47,46,40,9,63,56,63,57,64,51,59,58,52,58,-1,-12,-13,-25,-4,-15,10,-9,-11,-6,-18,0,0,-1,-1,0,0,0,-1,-1,0,-1,-9,-34,-20,18,-55,-50,-33,2,-56,-32,-17,-9,-34,-21,17,-55,-50,-33,1,-57,-32,-18,0,0,1,-2,1,0,0,1,0,0,1,69,69,69,69,69,69,69,69,69,69,69,69,11.57512483,9.8477041108,8.7456846951,12.294131292,11.530768326,14.504815123,11.931750388,11.317120154,11.219512195,9.843730774,14.298683613,12.824916982,14.499424626,13.221990257,15.060595364,12.126976578,14.079465458,13.96580785,12.682926829,14.273409622,-2.723558783,-2.977212871,-5.753739931,-0.927858965,-3.529827038,2.3778385448,-2.14771507,-2.648687696,-1.463414634,-4.429678848,0,-0.229016375,-0.230149597,0,0,0,-0.238635008,-0.240789791,0,-0.246093269,-7.716749887,-4.580327493,4.1426927503,-12.75806077,-11.76609013,-7.846867198,0.4772700155,-13.48422827,-7.804878049,-4.183585579,-7.716749887,-4.809343868,3.912543153,-12.75806077,-11.76609013,-7.846867198,0.2386350078,-13.72501806,-7.804878049,-4.429678848 +050,2,4,20,187,Kansas,Stanton County,2235,2236,2246,2213,2156,2179,2143,2072,2111,2056,2026,1987,1969,10,-33,-57,23,-36,-71,39,-55,-30,-39,-18,5,30,28,34,33,27,40,28,20,18,18,6,21,18,16,20,18,20,24,19,20,17,-1,9,10,18,13,9,20,4,1,-2,1,0,-3,0,6,11,3,16,9,10,9,6,11,-39,-68,-1,-62,-83,2,-68,-40,-47,-23,11,-42,-68,5,-51,-80,18,-59,-30,-38,-17,0,0,1,0,2,0,1,0,-1,1,-2,47,47,47,47,47,47,47,47,47,47,47,47,13.455931823,12.817578393,15.68627451,15.270708006,12.8113879,19.125029883,13.438924886,9.7991180794,8.9708447545,9.1001011122,9.4191522763,8.2398718242,7.3817762399,9.2549745488,8.5409252669,9.5625149414,11.519078474,9.3091621754,9.9676052828,8.5945399393,4.036779547,4.577706569,8.3044982699,6.0157334567,4.2704626335,9.5625149414,1.9198464123,0.489955904,-0.996760528,0.5055611729,-1.345593182,0,2.76816609,5.0902360019,1.4234875445,7.6500119531,4.3196544276,4.8995590397,4.4854223773,3.0333670374,-17.49271137,-31.12840467,-0.461361015,-28.6904211,-39.3831554,0.9562514941,-32.63738901,-19.59823616,-23.42387241,-11.62790698,-18.83830455,-31.12840467,2.306805075,-23.6001851,-37.95966785,8.6062634473,-28.31773458,-14.69867712,-18.93845004,-8.594539939 +050,2,4,20,189,Kansas,Stevens County,5724,5726,5751,5631,5737,5806,5838,5791,5655,5542,5496,5405,5388,25,-120,106,69,32,-47,-136,-113,-46,-91,-17,12,95,81,97,76,81,80,66,72,65,67,5,42,46,46,49,54,48,54,51,31,38,7,53,35,51,27,27,32,12,21,34,29,2,7,7,20,49,29,28,0,11,18,16,15,-180,64,-2,-46,-105,-196,-126,-78,-144,-63,17,-173,71,18,3,-76,-168,-126,-67,-126,-47,1,0,0,0,2,2,0,1,0,1,1,72,72,72,72,72,72,72,72,72,72,72,72,16.693024073,14.250527797,16.806722689,13.053933356,13.930690515,13.978682509,11.788872019,13.045841638,11.925511421,12.415454461,7.3800738007,8.0928923293,7.9701983886,8.4163517692,9.2871270101,8.3872095055,9.6454407431,9.2408044936,5.6875516008,7.0416010377,9.3129502724,6.157635468,8.8365243004,4.6375815871,4.643563505,5.5914730037,2.1434312762,3.8050371444,6.2379598202,5.3738534235,1.2300123001,1.2315270936,3.4653036472,8.4163517692,4.9875311721,4.8925388782,0,1.9931146947,3.3024493166,2.9648846475,-31.62888772,11.259676284,-0.346530365,-7.901064926,-18.05830252,-34.24777215,-22.5060284,-14.13299511,-26.41959453,-11.6742333,-30.39887542,12.491203378,3.1187732825,0.515286843,-13.07077135,-29.35523327,-22.5060284,-12.13988041,-23.11714522,-8.709348652 +050,2,4,20,191,Kansas,Sumner County,24132,24137,24119,23788,23632,23534,23381,23414,23165,23103,22982,22810,22578,-18,-331,-156,-98,-153,33,-249,-62,-121,-172,-232,71,296,271,278,246,277,262,276,251,255,249,37,291,287,260,259,245,276,248,295,250,276,34,5,-16,18,-13,32,-14,28,-44,5,-27,0,2,7,15,13,18,9,2,4,2,1,-54,-339,-149,-134,-153,-15,-245,-91,-80,-180,-206,-54,-337,-142,-119,-140,3,-236,-89,-76,-178,-205,2,1,2,3,0,-2,1,-1,-1,1,0,409,409,409,409,409,409,409,409,409,409,409,409,12.357275555,11.429776466,11.788152483,10.48705105,11.838871674,11.249704803,11.930491917,10.892915265,11.137316562,10.9720631,12.148537792,12.104597216,11.024890811,11.041244804,10.471204188,11.850834067,10.720152157,12.802430292,10.918937806,12.161804882,0.2087377627,-0.674820751,0.7632616715,-0.554193755,1.3676674858,-0.601129264,1.2103397597,-1.909515027,0.2183787561,-1.189741782,0.0834951051,0.2952340784,0.636051393,0.5541937547,0.7693129608,0.3864402413,0.08645284,0.1735922751,0.0873515024,0.0440645104,-14.15242031,-6.284268241,-5.68205911,-6.522434189,-0.641094134,-10.51976212,-3.933604219,-3.471845503,-7.86163522,-9.077289151,-14.06892521,-5.989034163,-5.046007717,-5.968240435,0.1282188268,-10.13332188,-3.847151379,-3.298253228,-7.774283718,-9.033224641 +050,2,4,20,193,Kansas,Thomas County,7900,7902,7932,7948,7942,7944,7849,7908,7838,7824,7673,7704,7702,30,16,-6,2,-95,59,-70,-14,-151,31,-2,25,106,115,96,133,127,97,128,108,101,102,30,73,71,72,81,78,82,71,80,66,63,-5,33,44,24,52,49,15,57,28,35,39,3,11,4,0,10,12,8,1,6,7,6,30,-29,-53,-22,-162,-2,-94,-72,-185,-11,-48,33,-18,-49,-22,-152,10,-86,-71,-179,-4,-42,2,1,-1,0,5,0,1,0,0,0,1,353,353,353,353,353,353,353,353,353,353,353,353,13.350125945,14.474512272,12.086113559,16.842905085,16.119819763,12.320589356,16.345294343,13.938181584,13.136502569,13.241594184,9.1939546599,8.9364380113,9.0645851693,10.257709112,9.900361744,10.415343579,9.0665304559,10.324578951,8.5842492034,8.1786317019,4.1561712846,5.5380742605,3.0215283898,6.5851959729,6.2194580187,1.9052457767,7.2787638871,3.6136026328,4.5522533654,5.0629624821,1.3853904282,0.5034612964,0,1.2663838409,1.523132576,1.0161310809,0.1276976121,0.7743434213,0.9104506731,0.7789173049,-3.652392947,-6.670862177,-2.769734357,-20.51541822,-0.253855429,-11.9395402,-9.194228068,-23.87558882,-1.430708201,-6.23133844,-2.267002519,-6.167400881,-2.769734357,-19.24903438,1.2692771467,-10.92340912,-9.066530456,-23.1012454,-0.520257527,-5.452421135 +050,2,4,20,195,Kansas,Trego County,3001,3006,3006,2953,2939,2943,2893,2904,2848,2842,2782,2779,2758,0,-53,-14,4,-50,11,-56,-6,-60,-3,-21,4,32,28,28,30,44,36,25,36,27,31,7,41,54,37,49,45,53,51,44,33,46,-3,-9,-26,-9,-19,-1,-17,-26,-8,-6,-15,0,1,1,0,0,1,2,1,2,1,1,3,-45,10,14,-31,11,-40,19,-53,2,-6,3,-44,11,14,-31,12,-38,20,-51,3,-5,0,0,1,-1,0,0,-1,0,-1,0,-1,64,64,64,64,64,64,64,64,64,64,64,64,10.740057057,9.5044127631,9.5205712343,10.281014393,15.180265655,12.517385257,8.7873462214,12.80227596,9.7104837259,11.197399314,13.760698104,18.3299389,12.580754845,16.792323509,15.525271692,18.42837274,17.926186292,15.647226174,11.868368998,16.615495756,-3.020641047,-8.825526137,-3.060183611,-6.511309116,-0.345006038,-5.910987483,-9.13884007,-2.844950213,-2.157885272,-5.418096442,0.335626783,0.339443313,0,0,0.3450060376,0.6954102921,0.3514938489,0.7112375533,0.3596475454,0.3612064295,-15.10320524,3.3944331297,4.7602856171,-10.62371487,3.7950664137,-13.90820584,6.6783831283,-18.84779516,0.7192950908,-2.167238577,-14.76757845,3.7338764426,4.7602856171,-10.62371487,4.1400724513,-13.21279555,7.0298769772,-18.13655761,1.0789426362,-1.806032147 +050,2,4,20,197,Kansas,Wabaunsee County,7053,7055,7047,7036,6993,7024,6936,6886,6876,6827,6882,6892,6906,-8,-11,-43,31,-88,-50,-10,-49,55,10,14,7,90,81,109,82,90,73,63,81,66,68,5,83,74,66,65,74,61,54,67,55,58,2,7,7,43,17,16,12,9,14,11,10,1,3,2,1,2,9,1,1,1,1,1,-11,-21,-52,-12,-108,-76,-24,-59,40,-1,3,-10,-18,-50,-11,-106,-67,-23,-58,41,0,4,0,0,0,-1,1,1,1,0,0,-1,0,90,90,90,90,90,90,90,90,90,90,90,90,12.781367606,11.547508732,15.55254334,11.747851003,13.022717407,10.608923122,9.1950667737,11.81705449,9.5832728329,9.8565009422,11.787261237,10.549575879,9.4171363345,9.3123209169,10.707567646,8.8649905537,7.881485806,9.7746006273,7.9860606941,8.4070155095,0.9941063694,0.9979328534,6.1354070058,2.435530086,2.3151497613,1.7439325679,1.3135809677,2.0424538624,1.5972121388,1.4494854327,0.4260455869,0.2851236724,0.1426838839,0.2865329513,1.3022717407,0.145327714,0.1459534409,0.1458895616,0.1452011035,0.1449485433,-2.982319108,-7.413215482,-1.712206606,-15.47277937,-10.99696137,-3.487865136,-8.61125301,5.8355824641,-0.145201104,0.4348456298,-2.556273521,-7.12809181,-1.569522722,-15.18624642,-9.694689625,-3.342537422,-8.465299569,5.9814720257,0,0.5797941731 +050,2,4,20,199,Kansas,Wallace County,1485,1485,1480,1525,1523,1560,1501,1505,1499,1513,1484,1518,1536,-5,45,-2,37,-59,4,-6,14,-29,34,18,2,18,16,22,17,20,20,21,25,33,31,10,18,13,21,21,21,17,21,12,10,10,-8,0,3,1,-4,-1,3,0,13,23,21,0,-1,0,1,0,1,0,0,0,0,0,3,46,-6,35,-56,3,-9,16,-43,12,-4,3,45,-6,36,-56,4,-9,16,-43,12,-4,0,0,1,0,1,1,0,-2,1,-1,1,19,19,19,19,19,19,19,19,19,19,19,19,11.980033278,10.498687664,14.271813169,11.107481215,13.306719894,13.315579228,13.944223108,16.683350017,21.985343105,20.30124427,11.980033278,8.530183727,13.623094389,13.721006207,13.972055888,11.318242344,13.944223108,8.008008008,6.6622251832,6.5487884741,0,1.968503937,0.6487187804,-2.613524992,-0.665335995,1.9973368842,0,8.6753420087,15.323117921,13.752455796,-0.665557404,0,0.6487187804,0,0.6653359947,0,0,0,0,0,30.615640599,-3.937007874,22.705157314,-36.58934989,1.996007984,-5.992010652,10.624169987,-28.69536203,7.9946702199,-2.61951539,29.950083195,-3.937007874,23.353876095,-36.58934989,2.6613439787,-5.992010652,10.624169987,-28.69536203,7.9946702199,-2.61951539 +050,2,4,20,201,Kansas,Washington County,5799,5794,5785,5820,5727,5626,5610,5568,5561,5475,5457,5449,5427,-9,35,-93,-101,-16,-42,-7,-86,-18,-8,-22,8,64,61,79,67,75,77,80,76,71,76,7,82,66,70,70,72,64,79,76,68,88,1,-18,-5,9,-3,3,13,1,0,3,-12,0,8,4,2,3,3,0,0,1,1,1,-10,46,-95,-114,-18,-47,-20,-86,-19,-13,-11,-10,54,-91,-112,-15,-44,-20,-86,-18,-12,-10,0,-1,3,2,2,-1,0,-1,0,1,0,114,114,114,114,114,114,114,114,114,114,114,114,11.029728565,10.565514852,13.917026337,11.925952296,13.419216318,13.837721269,14.498006524,13.904134651,13.020355767,13.97572637,14.131839724,11.43154066,12.331542324,12.45995016,12.882447665,11.501482613,14.316781443,13.904134651,12.47019989,16.182420007,-3.102111159,-0.866025808,1.585484013,-0.533997864,0.5367686527,2.3362386558,0.1812250816,0,0.5501558775,-2.206693637,1.3787160707,0.6928206461,0.3523297807,0.533997864,0.5367686527,0,0,0.1829491401,0.1833852925,0.1838911364,7.9276174063,-16.45449034,-20.0827975,-3.203987184,-8.409375559,-3.594213317,-15.58535701,-3.476033663,-2.384008802,-2.022802501,9.3063334769,-15.7616697,-19.73046772,-2.66998932,-7.872606906,-3.594213317,-15.58535701,-3.293084523,-2.20062351,-1.838911364 +050,2,4,20,203,Kansas,Wichita County,2234,2234,2239,2260,2228,2192,2187,2166,2133,2121,2112,2118,2074,5,21,-32,-36,-5,-21,-33,-12,-9,6,-44,9,33,21,35,28,21,24,20,33,16,22,6,28,24,28,27,23,23,27,24,16,21,3,5,-3,7,1,-2,1,-7,9,0,1,0,1,-2,2,4,2,1,1,2,2,2,3,15,-27,-46,-9,-22,-36,-4,-20,3,-47,3,16,-29,-44,-5,-20,-35,-3,-18,5,-45,-1,0,0,1,-1,1,1,-2,0,1,0,26,26,26,26,26,26,26,26,26,26,26,26,14.66992665,9.3582887701,15.837104072,12.788307833,9.6485182633,11.165387299,9.4029149036,15.59177888,7.5650118203,10.496183206,12.447210491,10.695187166,12.669683258,12.331582553,10.567424765,10.700162829,12.69393512,11.339475549,7.5650118203,10.019083969,2.2227161591,-1.336898396,3.1674208145,0.4567252797,-0.918906501,0.4652244708,-3.291020216,4.252303331,0,0.4770992366,0.4445432318,-0.891265597,0.9049773756,1.826901119,0.9189065013,0.4652244708,0.4701457452,0.9449562958,0.9456264775,0.9541984733,6.6681484774,-12.03208556,-20.81447964,-4.110527518,-10.10797151,-16.74808095,-1.880582981,-9.449562958,1.4184397163,-22.42366412,7.1126917093,-12.92335116,-19.90950226,-2.283626399,-9.189065013,-16.28285648,-1.410437236,-8.504606662,2.3640661939,-21.46946565 +050,2,4,20,205,Kansas,Wilson County,9409,9406,9389,9239,9121,9093,8971,8847,8709,8707,8668,8555,8362,-17,-150,-118,-28,-122,-124,-138,-2,-39,-113,-193,40,110,132,113,109,91,115,113,109,97,94,43,136,121,131,127,117,110,117,124,103,114,-3,-26,11,-18,-18,-26,5,-4,-15,-6,-20,0,3,0,2,0,1,0,0,0,0,0,-14,-126,-132,-11,-104,-99,-143,2,-22,-107,-172,-14,-123,-132,-9,-104,-98,-143,2,-22,-107,-172,0,-1,3,-1,0,0,0,0,-2,0,-1,121,121,121,121,121,121,121,121,121,121,121,121,11.810178226,14.379084967,12.408037773,12.068201949,10.214389943,13.100934154,12.976573266,12.54676259,11.264007432,11.113081516,14.601674898,13.180827887,14.384539365,14.061116032,13.132787069,12.531328321,13.435920992,14.273381295,11.96075016,13.477566944,-2.791496672,1.1982570806,-1.976501592,-1.992914083,-2.918397127,0.5696058328,-0.459347726,-1.726618705,-0.696742728,-2.364485429,0.3220957698,0,0.219611288,0,0.1122460433,0,0,0,0,0,-13.52802233,-14.37908497,-1.207862084,-11.5146147,-11.11235829,-16.29072682,0.2296738631,-2.532374101,-12.42524531,-20.33457469,-13.20592656,-14.37908497,-0.988250796,-11.5146147,-11.00011225,-16.29072682,0.2296738631,-2.532374101,-12.42524531,-20.33457469 +050,2,4,20,207,Kansas,Woodson County,3309,3309,3308,3322,3274,3214,3186,3142,3184,3127,3165,3096,3015,-1,14,-48,-60,-28,-44,42,-57,38,-69,-81,13,32,38,25,33,30,31,37,31,23,21,14,45,49,66,44,54,47,55,36,46,45,-1,-13,-11,-41,-11,-24,-16,-18,-5,-23,-24,0,0,0,0,0,0,0,-1,-1,-1,-1,0,27,-39,-19,-18,-19,57,-38,44,-46,-56,0,27,-39,-19,-18,-19,57,-39,43,-47,-57,0,0,2,0,1,-1,1,0,0,1,0,39,39,39,39,39,39,39,39,39,39,39,39,9.653092006,11.522134627,7.7065351418,10.3125,9.4816687737,9.8008220044,11.725558549,9.8537825811,7.3470691583,6.8728522337,13.574660633,14.857489388,20.345252774,13.75,17.067003793,14.859310781,17.429884329,11.443102352,14.694138317,14.727540501,-3.921568627,-3.33535476,-12.63871763,-3.4375,-7.585335019,-5.058488776,-5.70432578,-1.589319771,-7.347069158,-7.854688267,0,0,0,0,0,0,-0.316906988,-0.317863954,-0.319437789,-0.327278678,8.1447963801,-11.8253487,-5.856966708,-5.625,-6.00505689,18.020866266,-12.04246554,13.986013986,-14.69413832,-18.32760596,8.1447963801,-11.8253487,-5.856966708,-5.625,-6.00505689,18.020866266,-12.35937252,13.668150032,-15.01357611,-18.65488463 +050,2,4,20,209,Kansas,Wyandotte County,157505,157523,157636,158039,159424,161004,162325,163776,164924,165254,165781,166009,165265,113,403,1385,1580,1321,1451,1148,330,527,228,-744,626,2766,2731,2798,2679,2720,2776,2585,2661,2551,2572,357,1334,1341,1357,1386,1367,1369,1392,1407,1419,1523,269,1432,1390,1441,1293,1353,1407,1193,1254,1132,1049,45,456,528,697,772,878,851,332,612,459,366,-196,-1489,-502,-541,-716,-761,-1106,-1192,-1334,-1363,-2153,-151,-1033,26,156,56,117,-255,-860,-722,-904,-1787,-5,4,-31,-17,-28,-19,-4,-3,-5,0,-6,1335,1335,1335,1335,1335,1335,1335,1335,1335,1335,1335,1335,17.524352578,17.205154616,17.46414171,16.571356111,16.681948231,16.890781868,15.658220717,16.07684988,15.377196419,15.527931561,8.4517304189,8.4482286125,8.46992148,8.5733107763,8.3839055998,8.3297839976,8.4318155661,8.5006117178,8.5536031827,9.1948055084,9.0726221589,8.756926004,8.9942202304,7.9980453346,8.298042631,8.5609978704,7.2264051512,7.5762381621,6.8235932367,6.3331260528,2.8890472796,3.3263718922,4.3504312981,4.7753217311,5.3848347598,5.1779738363,2.0110364712,3.6974942227,2.7668103318,2.2096512253,-9.433753069,-3.162573276,-3.376733619,-4.428925336,-4.667265663,-6.729540615,-7.220347812,-8.05957074,-8.216040266,-12.99830352,-6.544705789,0.1637986159,0.9736976794,0.346396395,0.7175690967,-1.551566778,-5.209311341,-4.362076518,-5.449229935,-10.78865229 +040,3,6,21,000,Kentucky,Kentucky,4339367,4339330,4348464,4370817,4387865,4406906,4416992,4429126,4440306,4455590,4464273,4472345,4477251,9134,22353,17048,19041,10086,12134,11180,15284,8683,8072,4906,13677,55322,55282,56040,55745,55928,55919,54605,54653,53499,52831,10554,42513,42856,44420,43641,46308,46715,48536,48420,47227,49879,3123,12809,12426,11620,12104,9620,9204,6069,6233,6272,2952,1630,5548,8316,9326,5447,7900,7550,6464,1490,2538,2210,4189,4019,-3545,-1824,-7146,-5233,-5453,2864,1025,-750,-308,5819,9567,4771,7502,-1699,2667,2097,9328,2515,1788,1902,192,-23,-149,-81,-319,-153,-121,-113,-65,12,52,125870,127959,129468,131198,131878,130222,132480,129840,132634,131748,133232,131670,12.689578418,12.623360455,12.743936141,12.635005527,12.644642543,12.609375662,12.276447476,12.254224084,11.972985754,11.80634299,9.7514921242,9.7859472464,10.101456877,9.8915467971,10.469677208,10.533932725,10.911998072,10.856668987,10.569322757,11.146648407,2.938086294,2.837413209,2.6424792641,2.7434587299,2.1749653351,2.075442937,1.3644494045,1.397555097,1.4036629964,0.6596945829,1.2725819939,1.8989158414,2.1208056469,1.2346017599,1.7860941941,1.7024765509,1.4532543996,0.3340858486,0.5680001092,0.493877042,0.9218650024,-0.809482523,-0.414791926,-1.61969234,-1.183117838,-1.229616508,0.6438924196,0.2298241576,-0.167848732,-0.068829923,2.1944469963,1.0894333188,1.7060137211,-0.38509058,0.6029763564,0.4728600433,2.0971468192,0.5639100062,0.4001513772,0.4250471194 +050,3,6,21,001,Kentucky,Adair County,18656,18656,18750,18984,18939,19128,19268,19172,19293,19311,19201,19472,19555,94,234,-45,189,140,-96,121,18,-110,271,83,37,192,179,232,221,205,239,203,176,195,182,31,184,187,203,181,194,182,214,223,205,233,6,8,-8,29,40,11,57,-11,-47,-10,-51,1,6,7,19,8,7,14,8,-1,0,2,74,220,-40,137,94,-116,51,23,-61,280,134,75,226,-33,156,102,-109,65,31,-62,280,136,13,0,-4,4,-2,2,-1,-2,-1,1,-2,1055,1176,1297,1312,1363,1406,1253,1259,1180,1185,1421,1487,10.176498648,9.4401814202,12.189035122,11.511615793,10.665972945,12.426881581,10.517044866,9.1400083091,10.084555116,9.3268762651,9.7524778714,9.8620889698,10.665405732,9.4280654235,10.093652445,9.4631483167,11.086933996,11.580805983,10.601711789,11.940451482,0.424020777,-0.42190755,1.5236293903,2.0835503698,0.5723204995,2.963733264,-0.569889131,-2.440797673,-0.517156673,-2.613575217,0.3180155828,0.3691691058,0.9982399454,0.416710074,0.3642039542,0.7279344859,0.4144648223,-0.051931865,0,0.1024931458,11.660571368,-2.109537748,7.1978353955,4.8963433691,-6.035379813,2.6517613415,1.1915863641,-3.167843789,14.480386833,6.8670407666,11.978586951,-1.740368642,8.1960753408,5.3130534431,-5.671175858,3.3796958274,1.6060511864,-3.219775654,14.480386833,6.9695339124 +050,3,6,21,003,Kentucky,Allen County,19956,19943,20023,20164,20220,20304,20482,20655,20706,20891,21104,21320,21303,80,141,56,84,178,173,51,185,213,216,-17,67,242,234,264,263,245,241,251,240,250,247,19,216,204,224,193,246,225,254,259,233,265,48,26,30,40,70,-1,16,-3,-19,17,-18,2,10,2,3,-1,4,0,-1,-2,-1,-1,31,104,31,44,111,170,36,189,234,201,1,33,114,33,47,110,174,36,188,232,200,0,-1,1,-7,-3,-2,0,-1,0,0,-1,1,197,197,197,197,197,197,197,197,197,197,197,197,12.043695722,11.588748019,13.029315961,12.896582161,11.911417945,11.653490003,12.068177994,11.429932135,11.785781633,11.589986627,10.749744942,10.103011094,11.055177179,9.4640317756,11.960035977,10.879814318,12.212419165,12.334801762,10.984348482,12.434601037,1.2939507801,1.4857369255,1.974138782,3.4325503849,-0.048618032,0.7736756848,-0.144241171,-0.904869627,0.801433151,-0.84461441,0.497673377,0.0990491284,0.1480604086,-0.049036434,0.1944721297,0,-0.04808039,-0.095249434,-0.047143127,-0.046923023,5.1758031204,1.5352614897,2.1715526602,5.4430441818,8.2650655128,1.7407702909,9.087193788,11.144183831,9.475768433,0.0469230228,5.6734764974,1.6343106181,2.3196130688,5.3940077478,8.4595376425,1.7407702909,9.0391133976,11.048934397,9.4286253064,0 +050,3,6,21,005,Kentucky,Anderson County,21421,21469,21478,21570,21702,21758,21881,21933,22198,22553,22615,22700,22833,9,92,132,56,123,52,265,355,62,85,133,45,243,262,245,259,253,270,297,243,248,241,68,196,174,189,219,215,208,280,243,216,214,-23,47,88,56,40,38,62,17,0,32,27,2,-1,1,3,4,15,13,12,3,9,7,31,47,46,1,84,0,190,325,60,42,97,33,46,47,4,88,15,203,337,63,51,104,-1,-1,-3,-4,-5,-1,0,1,-1,2,2,108,108,108,108,108,108,108,108,108,108,108,108,11.2897231,12.109447218,11.274735389,11.87011618,11.548820012,12.236296481,13.273446403,10.759829968,10.945603001,10.585729032,9.1061141052,8.0421519689,8.6976530143,10.036893604,9.8142146346,9.426480252,12.513686845,10.759829968,9.5332671301,9.3997759866,2.1836089946,4.0672952487,2.5770823746,1.8332225761,1.7346053773,2.809816229,0.7597595584,0,1.4123358711,1.185953045,-0.046459766,0.0462192642,0.1380579844,0.1833222576,0.6847126489,0.5891550157,0.5363008648,0.132837407,0.3972194638,0.307469308,2.1836089946,2.1260861527,0.0460193281,3.8497674099,0,8.6107271532,14.524815088,2.6567481403,1.8536908309,4.2606461248,2.1371492288,2.1723054169,0.1840773125,4.0330896675,0.6847126489,9.199882169,15.061115953,2.7895855473,2.2509102946,4.5681154328 +050,3,6,21,007,Kentucky,Ballard County,8249,8237,8250,8258,8274,8244,8178,8208,8043,8002,7940,7817,7769,13,8,16,-30,-66,30,-165,-41,-62,-123,-48,18,98,80,80,77,86,88,64,81,78,74,16,105,102,107,100,115,104,111,118,92,107,2,-7,-22,-27,-23,-29,-16,-47,-37,-14,-33,0,2,3,1,1,4,0,-1,-1,-1,-1,13,13,35,-5,-44,56,-149,7,-23,-108,-14,13,15,38,-4,-43,60,-149,6,-24,-109,-15,-2,0,0,1,0,-1,0,0,-1,0,0,127,127,127,127,127,127,127,127,127,127,127,127,11.873031258,9.6781998548,9.6864027122,9.3776641091,10.496765532,10.830102763,7.9775631038,10.161836658,9.900361744,9.4957012704,12.721104919,12.339704815,12.955563628,12.178784557,14.036372513,12.799212356,13.836086008,14.803663279,11.677349749,13.730270756,-0.848073661,-2.66150496,-3.269160915,-2.801120448,-3.539606982,-1.969109593,-5.858522904,-4.641826622,-1.776988005,-4.234569485,0.2423067604,0.3629324946,0.1210800339,0.1217878456,0.4882216526,0,-0.124649423,-0.125454774,-0.126927715,-0.128320287,1.5749939423,4.2342124365,-0.60540017,-5.358665205,6.8351031368,-18.33733309,0.8725459645,-2.885459792,-13.70819318,-1.796484024,1.8173007027,4.597144931,-0.484320136,-5.23687736,7.3233247895,-18.33733309,0.747896541,-3.010914565,-13.8351209,-1.924804312 +050,3,6,21,009,Kentucky,Barren County,42173,42164,42117,42322,42610,42944,43041,43559,43789,43787,44071,44185,44300,-47,205,288,334,97,518,230,-2,284,114,115,109,512,527,530,577,555,582,596,543,575,558,119,439,466,442,502,511,501,555,526,516,563,-10,73,61,88,75,44,81,41,17,59,-5,7,29,43,46,24,26,29,35,9,7,5,-43,105,189,203,7,446,122,-75,260,47,113,-36,134,232,249,31,472,151,-40,269,54,118,-1,-2,-5,-3,-9,2,-2,-3,-2,1,2,702,702,702,702,702,702,702,701,702,702,701,702,12.127097668,12.409927942,12.389835659,13.420945514,12.817551963,13.32600632,13.611034987,12.360855016,13.030275562,12.612307171,10.398038821,10.97348467,10.332655399,11.676455196,11.801385681,11.471355955,12.674705399,11.973866922,11.693255983,12.725320676,1.7290588472,1.4364432723,2.0571802604,1.7444903181,1.0161662818,1.8546503641,0.936329588,0.3869880944,1.3370195794,-0.113013505,0.6868863914,1.0125747657,1.075344227,0.5582369018,0.6004618938,0.6640106242,0.7993057459,0.20487605,0.1586294416,0.1130135051,2.4870024515,4.450619319,4.745540828,0.1628190964,10.300230947,2.7934240051,-1.712798027,5.9186414441,1.0650833938,2.5541052156,3.1738888428,5.4631940847,5.8208850551,0.7210559981,10.900692841,3.4574346293,-0.913492281,6.1235174941,1.2237128354,2.6671187207 +050,3,6,21,011,Kentucky,Bath County,11591,11592,11622,11721,11783,11979,12135,12209,12255,12393,12444,12532,12481,30,99,62,196,156,74,46,138,51,88,-51,35,147,145,186,164,162,169,184,186,195,183,18,155,133,129,134,140,165,146,154,147,167,17,-8,12,57,30,22,4,38,32,48,16,1,4,1,-2,0,4,4,4,0,2,1,12,103,49,141,126,48,41,96,21,39,-69,13,107,50,139,126,52,45,100,21,41,-68,0,0,0,0,0,0,-3,0,-2,-1,1,103,103,103,103,103,103,103,103,103,103,103,103,12.594782162,12.338325391,15.655247875,13.602056896,13.309234308,13.816219751,14.930217462,14.977654306,15.614990391,14.632391157,13.280212483,11.3172226,10.857671913,11.113875757,11.501807427,13.489208633,11.846802986,12.400853565,11.771300448,13.353056411,-0.685430322,1.021102791,4.7975759616,2.4881811396,1.8074268814,0.3270111184,3.0834144758,2.5768007408,3.8436899423,1.2793347459,0.3427151609,0.0850918993,-0.168335999,0,0.3286230693,0.3270111184,0.3245699448,0,0.1601537476,0.0799584216,8.8249153922,4.1695030633,11.867687905,10.450360786,3.9434768321,3.3518639634,7.7896786758,1.6910254862,3.1229980782,-5.517131092,9.1676305531,4.2545949626,11.699351906,10.450360786,4.2720999014,3.6788750818,8.1142486206,1.6910254862,3.2831518258,-5.43717267 +050,3,6,21,013,Kentucky,Bell County,28691,28688,28704,28656,28288,28034,27830,27376,27222,26865,26534,26026,25482,16,-48,-368,-254,-204,-454,-154,-357,-331,-508,-544,83,346,378,374,327,339,357,321,328,322,317,95,376,375,366,379,396,401,417,392,422,403,-12,-30,3,8,-52,-57,-44,-96,-64,-100,-86,1,-1,-1,8,1,8,3,6,3,-2,-1,26,-15,-383,-271,-149,-407,-111,-267,-272,-406,-453,27,-16,-384,-263,-148,-399,-108,-261,-269,-408,-454,1,-2,13,1,-4,2,-2,0,2,0,-4,952,952,949,950,952,952,952,949,930,944,947,919,12.064156206,13.27620118,13.280778381,11.707002721,12.281273775,13.077402103,11.869765378,12.284874249,12.252663623,12.30876757,13.110181311,13.170834504,12.99669756,13.568666762,14.34626671,14.689182754,15.419601753,14.681922882,16.057838661,15.648054671,-1.046025105,0.105366676,0.284080821,-1.861664041,-2.064992936,-1.611780651,-3.549836375,-2.397048634,-3.805175038,-3.339287101,-0.034867503,-0.035122225,0.284080821,0.0358012316,0.2898235699,0.1098941353,0.2218647734,0.1123616547,-0.076103501,-0.03882892,-0.523012552,-13.45181231,-9.623237811,-5.334383503,-14.74477412,-4.066083007,-9.872982417,-10.18745669,-15.44901065,-17.58950066,-0.557880056,-13.48693453,-9.33915699,-5.298582271,-14.45495055,-3.956188871,-9.651117644,-10.07509504,-15.52511416,-17.62832958 +050,3,6,21,015,Kentucky,Boone County,118811,118810,119380,121742,123456,125083,126752,128270,129649,131151,131971,133670,135396,570,2362,1714,1627,1669,1518,1379,1502,820,1699,1726,432,1666,1747,1751,1689,1735,1597,1640,1734,1678,1668,140,702,693,784,777,840,880,933,944,907,1081,292,964,1054,967,912,895,717,707,790,771,587,100,258,315,320,155,224,280,212,30,92,88,176,1136,363,360,613,414,388,592,3,838,1050,276,1394,678,680,768,638,668,804,33,930,1138,2,4,-18,-20,-11,-15,-6,-9,-3,-2,1,835,835,835,835,835,835,835,835,834,834,834,834,13.818730767,14.249708399,14.09034397,13.413544583,13.606669229,12.383732877,12.576687117,13.180197779,12.633591953,12.398444991,5.8227785105,5.652574654,6.3088690306,6.1707070105,6.5876669464,6.8238477972,7.1549079755,7.1753787217,6.8287651379,8.0352032587,7.9959522565,8.597133745,7.7814749395,7.2428375722,7.0190022822,5.5598850802,5.4217791411,6.0048190573,5.8048268151,4.3632417325,2.1399955209,2.5693521154,2.5750485839,1.230964719,1.7567111857,2.1712242991,1.6257668712,0.2280311034,0.6926641595,0.6541146039,9.4226159372,2.9608724378,2.8969296569,4.8682669208,3.2467787093,3.0086965288,4.5398773006,0.0228031103,6.3092670183,7.8047765232,11.562611458,5.5302245532,5.4719782408,6.0992316398,5.003489895,5.1799208279,6.1656441718,0.2508342138,7.0019311778,8.4588911271 +050,3,6,21,017,Kentucky,Bourbon County,19985,20008,19965,20051,20050,20023,20049,20159,20123,20088,20102,19774,19901,-43,86,-1,-27,26,110,-36,-35,14,-328,127,47,215,240,231,211,227,231,218,205,222,209,76,199,199,199,187,218,225,237,235,241,250,-29,16,41,32,24,9,6,-19,-30,-19,-41,11,66,38,23,-3,9,1,7,-2,-13,-7,-24,5,-79,-82,11,94,-41,-22,48,-296,177,-13,71,-41,-59,8,103,-40,-15,46,-309,170,-1,-1,-1,0,-6,-2,-2,-1,-2,0,-2,236,236,236,236,236,236,236,236,236,236,236,236,10.745701719,11.969776315,11.528959649,10.531044121,11.291285316,11.469142545,10.842804208,10.201542672,11.134517003,10.535601764,9.9460215914,9.9249395277,9.9318743293,9.3332002396,10.843613211,11.171242739,11.787819253,11.694451356,12.087471161,12.602394455,0.7996801279,2.0448367871,1.5970853193,1.197843881,0.4476721051,0.2978998064,-0.945015046,-1.492908684,-0.952954158,-2.066792691,3.2986805278,1.8952145832,1.1479050732,-0.149730485,0.4476721051,0.0496499677,0.3481634379,-0.099527246,-0.652021266,-0.352867045,0.24990004,-3.94005137,-4.092531131,0.5490117788,4.6756864306,-2.035648677,-1.094227948,2.388653894,-14.84602267,8.9224952741,3.5485805678,-2.044836787,-2.944626057,0.3992812937,5.1233585356,-1.985998709,-0.74606451,2.2891266484,-15.49804394,8.5696282294 +050,3,6,21,019,Kentucky,Boyd County,49542,49533,49602,49417,49238,48905,48828,48518,48175,47867,47406,46839,46516,69,-185,-179,-333,-77,-310,-343,-308,-461,-567,-323,126,564,580,573,620,638,570,562,536,507,476,115,610,573,610,583,611,597,662,672,646,647,11,-46,7,-37,37,27,-27,-100,-136,-139,-171,1,1,-2,7,-1,11,11,6,-5,-7,-5,59,-139,-178,-301,-110,-347,-327,-212,-322,-421,-144,60,-138,-180,-294,-111,-336,-316,-206,-327,-428,-149,-2,-1,-6,-2,-3,-1,0,-2,2,0,-3,2338,2338,2338,2335,2309,2286,2274,2142,2316,2114,2062,1911,11.391753098,11.758147078,11.676838898,12.687628539,13.107883221,11.789891719,11.703213178,11.251876187,10.759191469,10.197632692,12.320867712,11.616238407,12.430840712,11.93046361,12.55316089,12.348360274,13.785635451,14.106829847,13.708950077,13.861067966,-0.929114614,0.1419086716,-0.754001814,0.7571649289,0.5547223307,-0.558468555,-2.082422274,-2.854953659,-2.949758608,-3.663435274,0.0201981438,-0.040545335,0.1426489918,-0.020463917,0.2259979866,0.2275242262,0.1249453364,-0.104961532,-0.148548995,-0.10711799,-2.807541987,-3.608534793,-6.133906646,-2.25103087,-7.129209212,-6.763674723,-4.41473522,-6.759522635,-8.934160963,-3.084998125,-2.787343843,-3.649080128,-5.991257655,-2.271494787,-6.903211226,-6.536150497,-4.289789884,-6.864484167,-9.082709958,-3.192116116 +050,3,6,21,021,Kentucky,Boyle County,28432,28434,28668,28800,29026,29636,29820,29800,29984,29992,30109,30000,30367,234,132,226,610,184,-20,184,8,117,-109,367,83,296,287,298,339,329,322,303,347,284,309,58,321,326,265,309,333,326,332,340,357,360,25,-25,-39,33,30,-4,-4,-29,7,-73,-51,4,16,14,22,19,37,29,20,-3,7,11,186,143,248,535,140,-49,160,19,114,-44,410,190,159,262,557,159,-12,189,39,111,-37,421,19,-2,3,20,-5,-4,-1,-2,-1,1,-3,2301,2464,2502,2655,3200,3213,3227,3242,3256,3261,3277,3193,10.301385119,9.9263307163,10.159899083,11.403390743,11.036564911,10.77211294,10.104041617,11.547228831,9.4495000749,10.237381351,11.171434537,11.275204925,9.0348095871,10.394241119,11.170748071,10.905928007,11.071095105,11.314287616,11.878420869,11.927046234,-0.870049419,-1.348874209,1.1250894958,1.0091496233,-0.13418316,-0.133815068,-0.967053488,0.2329412156,-2.428920794,-1.689664883,0.556831628,0.4842112545,0.7500596638,0.6391280947,1.2411942301,0.9701592399,0.66693344,-0.09983195,0.2329102131,0.3644375238,4.9766826756,8.5774565075,18.24008728,4.7093649085,-1.64374371,5.3526027031,0.633586768,3.793614083,-1.464007054,13.583580433,5.5335143036,9.0616677619,18.990146944,5.3484930032,-0.40254948,6.322761943,1.3005202081,3.6937821334,-1.231096841,13.948017957 +050,3,6,21,023,Kentucky,Bracken County,8488,8485,8513,8512,8464,8425,8362,8292,8366,8284,8273,8330,8286,28,-1,-48,-39,-63,-70,74,-82,-11,57,-44,25,107,104,115,107,107,89,97,104,92,99,7,93,88,85,106,112,89,100,100,82,102,18,14,16,30,1,-5,0,-3,4,10,-3,2,6,5,2,2,3,3,1,0,0,0,8,-21,-68,-71,-67,-68,71,-79,-15,48,-43,10,-15,-63,-69,-65,-65,74,-78,-15,48,-43,0,0,-1,0,1,0,0,-1,0,-1,2,41,41,41,41,41,41,41,41,41,41,41,41,12.569750367,12.252591894,13.618331458,12.747959731,12.849765822,10.685556489,11.651651652,12.562662318,11.082334518,11.916225325,10.925110132,10.367577757,10.065723252,12.62881992,13.450222169,10.685556489,12.012012012,12.079482998,9.8777329398,12.277323062,1.6446402349,1.8850141376,3.5526082065,0.1191398106,-0.600456347,0,-0.36036036,0.4831793199,1.204601578,-0.361097737,0.704845815,0.589066918,0.2368405471,0.2382796211,0.3602738081,0.3601872974,0.1201201201,0,0,0,-2.466960352,-8.011310085,-8.407839422,-7.982367308,-8.166206317,8.524432705,-9.489489489,-1.81192245,5.7820875745,-5.175734232,-1.762114537,-7.422243167,-8.170998875,-7.744087687,-7.805932509,8.8846200024,-9.369369369,-1.81192245,5.7820875745,-5.175734232 +050,3,6,21,025,Kentucky,Breathitt County,13878,13875,13855,13786,13608,13525,13361,13358,13164,12922,12762,12612,12550,-20,-69,-178,-83,-164,-3,-194,-242,-160,-150,-62,37,165,163,179,179,179,148,150,193,168,162,68,169,182,199,218,187,202,187,205,191,202,-31,-4,-19,-20,-39,-8,-54,-37,-12,-23,-40,1,9,4,1,1,1,1,1,0,1,0,10,-75,-167,-62,-127,7,-143,-205,-149,-127,-22,11,-66,-163,-61,-126,8,-142,-204,-149,-126,-22,0,1,4,-2,1,-3,2,-1,1,-1,0,322,322,322,322,322,322,322,320,320,320,320,321,11.938786585,11.90041615,13.194265286,13.315480176,13.398705041,11.160545962,11.500421682,15.028811712,13.241901159,12.876559892,12.228211714,13.287581222,14.668484871,16.216618314,13.997529848,15.232637056,14.337192364,15.9632456,15.054780484,16.055957396,-0.289425129,-1.387165073,-1.474219585,-2.901138139,-0.598824806,-4.072091094,-2.836770682,-0.934433889,-1.812879325,-3.179397504,0.651206541,0.2920347521,0.0737109793,0.0743881574,0.0748531008,0.0754090943,0.0766694779,0,0.0788208402,0,-5.426721175,-12.1924509,-4.570080714,-9.44729599,0.5239717055,-10.78350049,-15.71724297,-11.60255412,-10.01024671,-1.748668627,-4.775514634,-11.90041615,-4.496369734,-9.372907833,0.5988248063,-10.7080914,-15.64057349,-11.60255412,-9.931425869,-1.748668627 +050,3,6,21,027,Kentucky,Breckinridge County,20059,20054,20045,20276,20079,20049,19893,19987,19988,20131,20286,20471,20537,-9,231,-197,-30,-156,94,1,143,155,185,66,45,204,229,216,224,221,253,251,232,221,235,70,210,255,223,216,242,225,244,270,196,219,-25,-6,-26,-7,8,-21,28,7,-38,25,16,0,-1,-1,-1,0,6,3,14,8,-2,-2,17,237,-174,-19,-165,112,-29,124,185,162,52,17,236,-175,-20,-165,118,-26,138,193,160,50,-1,1,4,-3,1,-3,-1,-2,0,0,0,301,301,301,301,301,301,300,300,299,299,299,299,10.118796657,11.349275183,10.765550239,11.216263582,11.083249749,12.657911194,12.512774496,11.480317688,10.844762863,11.461178307,10.416408323,12.637839177,11.114433812,10.81568274,12.136409228,11.257035647,12.163812657,13.360714551,9.6179797335,10.680842762,-0.297611666,-1.288563995,-0.348883573,0.4005808422,-1.053159478,1.4008755472,0.3489618385,-1.880396863,1.2267831293,0.7803355443,-0.049601944,-0.049560154,-0.04984051,0,0.3009027081,0.1500938086,0.6979236771,0.3958730237,-0.09814265,-0.097541943,11.755660822,-8.623466733,-0.946969697,-8.261979871,5.6168505517,-1.450906817,6.1816097111,9.1545636737,7.9495546777,2.5360905189,11.706058878,-8.673026886,-0.996810207,-8.261979871,5.9177532598,-1.300813008,6.8795333882,9.5504366974,7.8514120274,2.4385485759 +050,3,6,21,029,Kentucky,Bullitt County,74319,74293,74483,75192,75906,76886,78039,78698,79273,80309,81040,81803,82182,190,709,714,980,1153,659,575,1036,731,763,379,197,747,753,729,803,782,830,829,798,779,775,104,454,468,551,559,569,625,703,668,654,731,93,293,285,178,244,213,205,126,130,125,44,0,-7,16,18,7,8,10,9,0,3,-1,101,422,417,775,885,441,365,900,601,637,333,101,415,433,793,892,449,375,909,601,640,332,-4,1,-4,9,17,-3,-5,1,0,-2,3,340,340,340,340,340,340,340,340,340,340,340,340,9.9816268582,9.967041258,9.542384418,10.366306277,9.9784990143,10.508257845,10.389642942,9.8916014354,9.5674975283,9.4520840321,6.0664773676,6.1946551245,7.2124194984,7.2163950299,7.2605702546,7.9128447626,8.8105174769,8.2801876677,8.0322764872,8.9154495838,3.9151494906,3.7723861335,2.3299649196,3.1499112474,2.7179287596,2.5954130821,1.5791254653,1.6114137677,1.5352210411,0.5366344483,-0.093535995,0.2117830812,0.2356144301,0.0903663063,0.1020818313,0.1266055162,0.1127946761,0,0.036845305,-0.012196237,5.6388842492,5.5195965532,10.144510184,11.424883008,5.6272609531,4.6211013414,11.279467609,7.4496898028,7.8234864256,4.0613470744,5.5453482546,5.7313796344,10.380124614,11.515249314,5.7293427844,4.7477068576,11.392262285,7.4496898028,7.8603317306,4.049150837 +050,3,6,21,031,Kentucky,Butler County,12690,12706,12742,12727,12745,12714,12745,12742,12691,12792,12731,12861,12703,36,-15,18,-31,31,-3,-51,101,-61,130,-158,35,142,144,146,175,154,150,160,152,163,160,15,154,154,135,148,140,163,174,165,155,167,20,-12,-10,11,27,14,-13,-14,-13,8,-7,4,22,24,2,1,1,4,8,6,6,3,13,-24,3,-45,6,-18,-42,110,-54,117,-153,17,-2,27,-43,7,-17,-38,118,-48,123,-150,-1,-1,1,1,-3,0,0,-3,0,-1,-1,203,203,203,203,203,203,203,203,203,203,203,203,11.15081079,11.306532663,11.469421423,13.747594171,12.084592145,11.795698502,12.557391202,11.91082553,12.738355736,12.517602879,12.093132828,12.091708543,10.605286932,11.626536785,10.985992859,12.817992372,13.656162932,12.929514555,12.113160363,13.065248005,-0.942322039,-0.785175879,0.8641344907,2.1210573864,1.0985992859,-1.02229387,-1.09877173,-1.018689026,0.6251953736,-0.547645126,1.727590404,1.8844221106,0.157115362,0.078557681,0.0784713776,0.3145519601,0.6278695601,0.4701641657,0.4688965302,0.234705054,-1.884644077,0.2355527638,-3.535095644,0.4713460859,-1.412484796,-3.302795581,8.6332064514,-4.231477491,9.1434823382,-11.96995775,-0.157053673,2.1199748744,-3.377980282,0.5499037668,-1.334013419,-2.98824362,9.2610760115,-3.761313325,9.6123788684,-11.7352527 +050,3,6,21,033,Kentucky,Caldwell County,12984,12989,13010,13026,12988,12882,12844,12744,12635,12660,12684,12731,12687,21,16,-38,-106,-38,-100,-109,25,24,47,-44,39,138,154,156,158,134,152,145,136,151,143,26,167,175,169,167,196,151,163,162,159,183,13,-29,-21,-13,-9,-62,1,-18,-26,-8,-40,0,0,0,0,-1,-1,-1,-1,-1,-1,-1,9,46,-17,-92,-27,-35,-109,46,52,56,-2,9,46,-17,-92,-28,-36,-110,45,51,55,-3,-1,-1,0,-1,-1,-2,0,-2,-1,0,-1,148,148,148,148,148,148,148,148,148,148,148,148,10.600706714,11.839778581,12.060301508,12.283293166,10.473659528,11.978407345,11.464716347,10.732323232,11.88274641,11.251868754,12.828391458,13.454293842,13.065326633,12.982974423,15.319681101,11.899602033,12.887922514,12.784090909,12.512295888,14.39924463,-2.227684744,-1.614515261,-1.005025126,-0.699681256,-4.846021573,0.0788053115,-1.423206167,-2.051767677,-0.629549479,-3.147375875,0,0,0,-0.077742362,-0.078161638,-0.078805311,-0.079067009,-0.078914141,-0.078693685,-0.078684397,3.5335689046,-1.306988545,-7.112485504,-2.099043769,-2.735657339,-8.589778951,3.6370824274,4.1035353535,4.4068463506,-0.157368794,3.5335689046,-1.306988545,-7.112485504,-2.176786131,-2.813818978,-8.668584263,3.5580154181,4.0246212121,4.3281526657,-0.236053191 +050,3,6,21,035,Kentucky,Calloway County,37191,37199,37360,37680,38065,38449,38482,38695,38760,38841,38982,39073,39300,161,320,385,384,33,213,65,81,141,91,227,110,393,391,358,402,396,387,398,359,336,339,118,389,385,383,371,420,401,377,397,405,445,-8,4,6,-25,31,-24,-14,21,-38,-69,-106,26,97,132,227,146,209,162,111,34,56,47,133,218,245,183,-142,32,-83,-48,146,102,286,159,315,377,410,4,241,79,63,180,158,333,10,1,2,-1,-2,-4,0,-3,-1,2,0,2952,3025,3103,3276,3479,3312,3357,3230,3232,3233,3237,3238,10.474413646,10.324113803,9.3577645921,10.450923555,10.262124726,9.9928991027,10.257599773,9.2260642741,8.6093139453,8.6509384609,10.367803838,10.165687504,10.011239773,9.6450065643,10.884071679,10.354399329,9.7163696344,10.202639323,10.377298059,11.355951667,0.1066098081,0.1584262988,-0.653475181,0.8059169905,-0.621946953,-0.361500226,0.5412301388,-0.976575049,-1.767984114,-2.705013206,2.5852878465,3.4853785728,5.9335546436,3.7956090523,5.4161213833,4.183074043,2.8607878764,0.873777675,1.4348856575,1.199392648,5.8102345416,6.4690738663,4.783438325,-3.691619763,0.8292626041,-2.143179911,-1.23709746,3.7521041337,2.6135417334,7.2984318579,8.3955223881,9.9544524391,10.716992969,0.1039892891,6.2453839875,2.0398941321,1.6236904164,4.6258818087,4.0484273909,8.4978245059 +050,3,6,21,037,Kentucky,Campbell County,90336,90340,90806,91631,91659,91862,92403,92612,92821,93366,93990,93841,94020,466,825,28,203,541,209,209,545,624,-149,179,284,1155,1196,1101,1144,1098,1085,1036,1150,1095,1088,185,770,866,856,782,848,903,855,903,845,962,99,385,330,245,362,250,182,181,247,250,126,13,82,122,214,92,149,140,124,38,61,57,321,359,-415,-243,100,-179,-109,240,338,-463,-8,334,441,-293,-29,192,-30,31,364,376,-402,49,33,-1,-9,-13,-13,-11,-4,0,1,3,4,2963,3232,3515,3550,3525,3664,3543,3633,3744,3723,3232,3201,12.661905206,13.050357357,11.99862686,12.416899574,11.869307894,11.702339929,11.128596519,12.276094707,11.659417242,11.583032135,8.4412701371,9.4495062469,9.3286326905,8.4877757577,9.1668243115,9.7393667794,9.1843146944,9.6394030616,8.9974498352,10.241614811,4.2206350685,3.6008511103,2.6699941696,3.9291238162,2.7024835824,1.9629731493,1.9442818242,2.6366916459,2.6619674069,1.3414173245,0.8989404562,1.3312237438,2.3321581726,0.9985618539,1.6106802151,1.5099793456,1.3319941779,0.4056448686,0.6495200473,0.6068316468,3.9356051678,-4.528343063,-2.648198299,1.0853933194,-1.934978245,-1.175626776,2.5780532475,3.6081043575,-4.929963638,-0.085169354,4.834545624,-3.197119319,-0.316040126,2.0839551733,-0.32429803,0.3343525694,3.9100474254,4.0137492261,-4.28044359,0.5216622929 +050,3,6,21,039,Kentucky,Carlisle County,5104,5099,5084,5034,5028,4959,4959,4849,4782,4785,4711,4721,4692,-15,-50,-6,-69,0,-110,-67,3,-74,10,-29,14,51,73,63,69,66,73,63,57,59,59,28,67,64,70,70,64,78,79,60,56,73,-14,-16,9,-7,-1,2,-5,-16,-3,3,-14,1,2,3,4,2,0,0,0,0,0,0,-2,-36,-18,-66,-1,-112,-63,19,-72,9,-16,-1,-34,-15,-62,1,-112,-63,19,-72,9,-16,0,0,0,0,0,0,1,0,1,-2,1,60,60,60,60,60,60,60,60,60,60,60,60,10.081043685,14.510037766,12.616401322,13.914095584,13.458401305,15.159381165,13.170272813,12.00505476,12.510602205,12.535854669,13.243724056,12.721129,14.018223691,14.115749143,13.050570962,16.197694943,16.515104003,12.636899747,11.87446989,15.510464252,-3.162680372,1.7889087657,-1.401822369,-0.201653559,0.4078303426,-1.038313778,-3.344831191,-0.631844987,0.6361323155,-2.974609582,0.3953350465,0.5963029219,0.8010413538,0.4033071184,0,0,0,0,0,0,-7.116030836,-3.577817531,-13.21718234,-0.201653559,-22.83849918,-13.08275361,3.9719870388,-15.1642797,1.9083969466,-3.399553809,-6.72069579,-2.981514609,-12.41614098,0.2016535592,-22.83849918,-13.08275361,3.9719870388,-15.1642797,1.9083969466,-3.399553809 +050,3,6,21,041,Kentucky,Carroll County,10811,10807,10806,10994,10877,10844,10747,10693,10635,10720,10711,10658,10730,-1,188,-117,-33,-97,-54,-58,85,-9,-53,72,39,163,163,157,138,170,176,151,143,143,144,14,113,134,129,112,154,156,133,132,132,138,25,50,29,28,26,16,20,18,11,11,6,7,35,25,7,-3,1,-2,-2,-2,-2,0,-34,102,-176,-69,-123,-71,-76,70,-18,-63,66,-27,137,-151,-62,-126,-70,-78,68,-20,-65,66,1,1,5,1,3,0,0,-1,0,1,0,325,325,325,325,325,325,325,325,325,325,325,325,14.95412844,14.905582735,14.456056351,12.783104071,15.858208955,16.504126032,14.141887146,13.345154216,13.383873836,13.46549467,10.366972477,12.253669242,11.877906174,10.374693159,14.365671642,14.628657164,12.456099274,12.318603892,12.354345079,12.904432392,4.5871559633,2.6519134928,2.5781501772,2.408410912,1.4925373134,1.8754688672,1.6857878717,1.0265503243,1.0295287566,0.5610622779,3.2110091743,2.2861323213,0.6445375443,-0.277893567,0.0932835821,-0.187546887,-0.187309764,-0.186645514,-0.187187047,0,9.3577981651,-16.09437154,-6.353298651,-11.39363624,-6.623134328,-7.126781695,6.5558417232,-1.679809622,-5.89639197,6.171685057,12.568807339,-13.80823922,-5.708761107,-11.6715298,-6.529850746,-7.314328582,6.3685319597,-1.866455135,-6.083579016,6.171685057 +050,3,6,21,043,Kentucky,Carter County,27720,27716,27739,27621,27633,27599,27517,27443,27313,27216,27042,26766,26542,23,-118,12,-34,-82,-74,-130,-97,-174,-276,-224,83,340,332,364,397,378,372,350,323,301,289,55,310,295,308,264,339,306,352,344,354,391,28,30,37,56,133,39,66,-2,-21,-53,-102,2,3,3,27,9,6,5,11,4,4,2,-4,-152,-20,-114,-225,-120,-200,-105,-157,-227,-124,-2,-149,-17,-87,-216,-114,-195,-94,-153,-223,-122,-3,1,-8,-3,1,1,-1,-1,0,0,0,626,629,633,662,686,636,633,633,632,599,595,595,12.283236994,12.017229522,13.180764774,14.405980115,13.755458515,13.587552049,12.83720589,11.906078366,11.187927446,10.842650259,11.199421965,10.677959967,11.152954809,9.5797953407,12.336244541,11.176857331,12.910561353,12.680157765,13.157894737,14.669467997,1.0838150289,1.3392695551,2.0278099652,4.8261847739,1.4192139738,2.4106947184,-0.073355462,-0.774079398,-1.969967291,-3.826817738,0.1083815029,0.1085894234,0.9776940904,0.3265839321,0.2183406114,0.1826283878,0.4034550423,0.1474436949,0.1486767767,0.0750356419,-5.49132948,-0.723929489,-4.128041715,-8.164598302,-4.366812227,-7.30513551,-3.851161767,-5.787165026,-8.437407077,-4.6522098,-5.382947977,-0.615340066,-3.150347625,-7.83801437,-4.148471616,-7.122507123,-3.447706725,-5.639721331,-8.2887303,-4.577174158 +050,3,6,21,045,Kentucky,Casey County,15955,15963,15987,15916,16029,16017,15790,15756,15785,15836,15950,16204,16066,24,-71,113,-12,-227,-34,29,51,114,254,-138,44,175,203,200,196,196,200,211,189,186,189,34,205,162,195,189,194,209,193,189,194,220,10,-30,41,5,7,2,-9,18,0,-8,-31,0,1,-5,0,-2,-2,5,5,1,0,-1,14,-41,78,-13,-235,-31,34,29,116,262,-105,14,-40,73,-13,-237,-33,39,34,117,262,-106,0,-1,-1,-4,3,-3,-1,-1,-3,0,-1,480,480,480,480,480,480,479,476,476,476,475,477,10.970755101,12.709344185,12.482057043,12.324331122,12.426298104,12.68190609,13.345561494,11.892027937,11.569322635,11.713665944,12.851455976,10.142432306,12.170005617,11.884176439,12.299499144,13.252591865,12.207077575,11.892027937,12.066927909,13.634955067,-1.880700875,2.5669118798,0.3120514261,0.4401546829,0.1267989602,-0.570685774,1.1384839189,0,-0.497605275,-1.921289123,0.0626900292,-0.313038034,0,-0.125758481,-0.12679896,0.3170476523,0.316245533,0.0629207827,0,-0.061977068,-2.570291195,4.8833933323,-0.811333708,-14.7766215,-1.965383884,2.1559240354,1.8342240916,7.2988107972,16.296572744,-6.507592191,-2.507601166,4.5703552982,-0.811333708,-14.90237998,-2.092182844,2.4729716876,2.1504696246,7.3617315799,16.296572744,-6.569569259 +050,3,6,21,047,Kentucky,Christian County,73955,73943,74145,73516,74975,73726,73432,73243,71966,71293,71036,71577,71478,202,-629,1459,-1249,-294,-189,-1277,-673,-257,541,-99,372,1463,1438,1571,1472,1668,1494,1333,1344,1546,1530,98,584,611,651,576,581,542,638,644,646,660,274,879,827,920,896,1087,952,695,700,900,870,114,97,931,396,265,416,233,91,-66,-32,6,-190,-1614,-296,-2620,-1462,-1701,-2468,-1450,-890,-323,-968,-76,-1517,635,-2224,-1197,-1285,-2235,-1359,-956,-355,-962,4,9,-3,55,7,9,6,-9,-1,-4,-7,5389,5369,5373,4827,5015,5082,5444,5368,6092,5504,6201,6200,19.81565884,19.368177196,21.129649431,20.00570815,22.744162264,20.577236948,18.609651052,18.88582088,21.681052919,21.390374332,7.9100100907,8.2294549838,8.7558254484,7.8283205806,7.9222771433,7.4651020254,8.9069447644,9.0494558382,9.0594826559,9.2272202999,11.90564875,11.138722212,12.373823982,12.17738757,14.82188512,13.112134923,9.7027062872,9.8363650416,12.621570264,12.163154032,1.3138201692,12.539480507,5.3261242359,3.6015711004,5.672404977,3.2091674758,1.2704262908,-0.927428704,-0.448766943,0.0838838209,-21.86088405,-3.986773609,-35.23849873,-19.86979981,-23.1941367,-33.99238339,-20.24305628,-12.50623555,-4.529741328,-13.53325644,-20.54706388,8.5527068981,-29.9123745,-16.26822871,-17.52173172,-30.78321592,-18.97262999,-13.43366426,-4.978508271,-13.44937262 +050,3,6,21,049,Kentucky,Clark County,35613,35599,35599,35438,35694,35566,35643,35685,35869,35941,36209,36280,36463,0,-161,256,-128,77,42,184,72,268,71,183,104,404,436,426,379,454,448,434,430,421,420,116,374,385,418,402,426,422,421,418,447,421,-12,30,51,8,-23,28,26,13,12,-26,-1,4,7,5,18,1,5,8,10,-7,3,2,11,-199,204,-153,102,14,152,51,260,94,182,15,-192,209,-135,103,19,160,61,253,97,184,-3,1,-4,-1,-3,-5,-2,-2,3,0,0,458,458,458,458,458,458,458,458,458,458,458,458,11.37435421,12.258898948,11.956216671,10.644721875,12.729923733,12.522011348,12.087453001,11.91961192,11.615555464,11.547502853,10.529723947,10.824945172,11.731686781,11.290707635,11.944818304,11.795287475,11.725386436,11.586971587,12.332905682,11.574996907,0.8446302631,1.4339537761,0.2245298905,-0.64598576,0.7851054284,0.7267238729,0.3620665645,0.3326403326,-0.717350219,-0.027494054,0.1970803947,0.1405837035,0.5051922537,0.0280863374,0.1401973979,0.2236073455,0.278512742,-0.194040194,0.0827711791,0.0549881088,-5.602714079,5.7358151043,-4.294134157,2.8648064149,0.3925527142,4.2485395645,1.420414984,7.2072072072,2.5934969444,5.0039179028,-5.405633684,5.8763988079,-3.788941903,2.8928927523,0.5327501122,4.47214691,1.6989277259,7.0131670132,2.6762681234,5.0589060116 +050,3,6,21,051,Kentucky,Clay County,21730,21736,21668,21602,21530,21199,21093,20986,20627,20264,20116,19912,19631,-68,-66,-72,-331,-106,-107,-359,-363,-148,-204,-281,79,293,298,273,294,278,252,265,249,238,217,91,289,268,244,241,234,304,281,261,277,258,-12,4,30,29,53,44,-52,-16,-12,-39,-41,1,2,2,5,9,10,6,4,5,0,2,-61,-73,-103,-375,-169,-163,-315,-354,-142,-164,-242,-60,-71,-101,-370,-160,-153,-309,-350,-137,-164,-240,4,1,-1,10,1,2,2,3,1,-1,0,2240,2209,2209,2184,2090,2064,2031,1866,1715,1709,1754,1621,13.542870349,13.818046926,12.778206838,13.903338693,13.21324176,12.11159974,12.961287325,12.332838039,11.891675827,10.975393875,13.357984747,12.426968376,11.420814903,11.396954507,11.121937308,14.610818735,13.743855616,12.927191679,13.840311782,13.049085805,0.184885602,1.3910785496,1.3573919352,2.5063841861,2.0913044512,-2.499218994,-0.782568291,-0.59435364,-1.948635955,-2.07369193,0.092442801,0.09273857,0.2340330923,0.425612409,0.4752964662,0.2883714224,0.1956420728,0.2476473502,0,0.1011557039,-3.374162237,-4.776036354,-17.55248192,-7.992055235,-7.747332399,-15.13949968,-17.31432345,-7.033184745,-8.194264015,-12.23984017,-3.281719436,-4.683297784,-17.31844883,-7.566442826,-7.272035932,-14.85112825,-17.11868137,-6.785537395,-8.194264015,-12.13868447 +050,3,6,21,053,Kentucky,Clinton County,10272,10279,10256,10170,10282,10188,10218,10197,10209,10214,10142,10200,10110,-23,-86,112,-94,30,-21,12,5,-72,58,-90,26,114,118,119,104,136,122,106,92,125,112,48,126,122,132,125,170,125,123,131,123,134,-22,-12,-4,-13,-21,-34,-3,-17,-39,2,-22,0,15,14,19,13,14,0,-1,-1,-1,-1,1,-89,99,-100,40,0,17,24,-32,58,-67,1,-74,113,-81,53,14,17,23,-33,57,-68,-2,0,3,0,-2,-1,-2,-1,0,-1,0,136,136,136,136,136,136,136,136,136,136,136,136,11.162244199,11.539213769,11.626770884,10.193080467,13.323536615,11.95726747,10.38045341,9.0391039497,12.289843673,11.029049729,12.337217272,11.930373558,12.896922325,12.251298638,16.654420769,12.251298638,12.045243108,12.870898015,12.093206174,13.195470212,-1.174973074,-0.391159789,-1.270151441,-2.058218171,-3.330884154,-0.294031167,-1.664789698,-3.831794066,0.1966374988,-2.166420483,1.4687163419,1.3690592607,1.8563751832,1.2741350583,1.3715405339,0,-0.097928806,-0.09825113,-0.098318749,-0.098473658,-8.714383629,9.6812047721,-9.770395701,3.920415564,0,1.6661766147,2.3502913382,-3.144036156,5.7024874644,-6.597735106,-7.245667287,11.050264033,-7.914020518,5.1945506224,1.3715405339,1.6661766147,2.2523625324,-3.242287286,5.604168715,-6.696208764 +050,3,6,21,055,Kentucky,Crittenden County,9315,9315,9297,9249,9222,9180,9180,9174,9133,9011,8900,8807,8847,-18,-48,-27,-42,0,-6,-41,-122,-111,-93,40,25,82,108,105,119,115,87,90,104,88,92,47,109,130,138,120,138,122,136,127,126,116,-22,-27,-22,-33,-1,-23,-35,-46,-23,-38,-24,1,1,0,0,0,-1,0,1,0,0,0,5,-22,-3,-7,2,21,-6,-77,-87,-54,64,6,-21,-3,-7,2,20,-6,-76,-87,-54,64,-2,0,-2,-2,-1,-3,0,0,-1,-1,0,210,210,210,210,210,210,210,210,210,210,210,210,8.8428771703,11.694006822,11.411803065,12.962962963,12.531328321,9.5045610968,9.9206349206,11.612975267,9.9395719207,10.422567124,11.754556239,14.076119322,14.998369742,13.071895425,15.037593985,13.328235101,14.991181658,14.181229412,14.231659796,13.141497678,-2.911679068,-2.382112501,-3.586566678,-0.108932462,-2.506265664,-3.823674004,-5.070546737,-2.568254145,-4.292087875,-2.718930554,0.1078399655,0,0,0,-0.108968072,0,0.1102292769,0,0,0,-2.372479241,-0.324833523,-0.760786871,0.2178649237,2.2883295195,-0.655486972,-8.487654321,-9.714700463,-6.09928277,7.2504814773,-2.264639275,-0.324833523,-0.760786871,0.2178649237,2.1793614471,-0.655486972,-8.377425044,-9.714700463,-6.09928277,7.2504814773 +050,3,6,21,057,Kentucky,Cumberland County,6856,6845,6858,6865,6849,6785,6717,6731,6739,6706,6704,6626,6523,13,7,-16,-64,-68,14,8,-33,-2,-78,-103,19,79,78,77,80,78,91,73,66,70,76,11,95,93,105,97,119,94,108,94,105,119,8,-16,-15,-28,-17,-41,-3,-35,-28,-35,-43,1,6,7,8,2,0,0,0,0,0,0,4,18,-6,-46,-52,56,11,1,27,-41,-60,5,24,1,-38,-50,56,11,1,27,-41,-60,0,-1,-2,2,-1,-1,0,1,-1,-2,0,86,86,86,86,86,86,86,86,86,86,86,86,11.513517452,11.375236984,11.295291184,11.850096282,11.600237954,13.511507053,10.859055411,9.8434004474,10.502625656,11.559814435,13.845369088,13.562782558,15.402669796,14.368241742,17.697798929,13.956941351,16.065451841,14.019388516,15.753938485,18.100235759,-2.331851636,-2.187545574,-4.107378612,-2.51814546,-6.097560976,-0.445434298,-5.20639643,-4.175988069,-5.251312828,-6.540421325,0.8744443635,1.0208546011,1.1735367464,0.2962524071,0,0,0,0,0,0,2.6233330904,-0.87501823,-6.747836292,-7.702562583,8.3283759667,1.6332590943,0.1487541837,4.0268456376,-6.151537884,-9.12616929,3.4977774539,0.1458363716,-5.574299545,-7.406310176,8.3283759667,1.6332590943,0.1487541837,4.0268456376,-6.151537884,-9.12616929 +050,3,6,21,059,Kentucky,Daviess County,96656,96659,96722,97185,97871,98334,98488,99548,100080,100508,100885,101555,101978,63,463,686,463,154,1060,532,428,377,670,423,318,1293,1347,1300,1335,1358,1374,1344,1339,1313,1308,260,962,951,986,1010,1064,1017,1132,1102,1070,1143,58,331,396,314,325,294,357,212,237,243,165,10,41,75,144,131,235,211,172,43,72,67,7,96,234,20,-286,536,-30,50,101,355,187,17,137,309,164,-155,771,181,222,144,427,254,-12,-5,-19,-15,-16,-5,-6,-6,-4,0,4,2581,2581,2581,2608,2548,2544,2611,2580,2590,2618,2733,2741,13.336290077,13.811418259,13.251446191,13.565556696,13.714678139,13.765604023,13.400602229,13.297383722,12.971744714,12.852952592,9.9222823312,9.7510458535,10.050712265,10.263080347,10.745521016,10.18895145,11.286816759,10.943776596,10.571033393,11.231593894,3.414007746,4.0603724059,3.2007339263,3.3024763492,2.9691571229,3.5766525738,2.1137854707,2.3536071264,2.4007113219,1.6213586986,0.4228831347,0.7690099254,1.4678525012,1.3311520054,2.3733058636,2.1139319134,1.7149580234,0.4270257655,0.7113218731,0.6583698958,0.9901653886,2.3993109671,0.2038684029,-2.906179187,5.4131572037,-0.30055904,0.4985343091,1.0030140074,3.5072120134,1.8375398584,1.4130485233,3.1683208925,1.6717209042,-1.575027182,7.7864630673,1.8133728735,2.2134923325,1.430039773,4.2185338866,2.4959097542 +050,3,6,21,061,Kentucky,Edmonson County,12161,12187,12239,12244,12106,12075,12022,12009,12097,12248,12247,12149,12235,52,5,-138,-31,-53,-13,88,151,-1,-98,86,26,110,98,96,107,113,116,118,111,127,114,18,124,122,143,138,148,134,163,140,148,163,8,-14,-24,-47,-31,-35,-18,-45,-29,-21,-49,0,2,7,10,2,-2,3,3,-2,-1,-1,39,19,-121,8,-23,27,103,192,31,-76,138,39,21,-114,18,-21,25,106,195,29,-77,137,5,-2,0,-2,-1,-3,0,1,-1,0,-2,323,351,349,351,358,351,355,353,353,353,354,354,8.9858269003,8.0492813142,7.9401182747,8.8807735403,9.4045191627,9.6241599602,9.6939823372,9.0630740968,10.411542876,9.3503937008,10.129477597,10.020533881,11.827467847,11.45370793,12.317423328,11.117564092,13.390840008,11.430904266,12.13313658,13.369422572,-1.143650696,-1.971252567,-3.887349572,-2.57293439,-2.912904165,-1.493404132,-3.696857671,-2.367830169,-1.721593704,-4.019028871,0.1633786709,0.5749486653,0.8270956536,0.1659957671,-0.166451667,0.2489006886,0.2464571781,-0.163298632,-0.081980653,-0.082020997,1.5520973737,-9.938398357,0.6616765229,-1.908951322,2.2470974991,8.5455903095,15.773259396,2.5311288018,-6.230529595,11.318897638,1.7154760446,-9.363449692,1.4887721765,-1.742955555,2.0806458325,8.7944909981,16.019716574,2.3678301694,-6.312510248,11.23687664 +050,3,6,21,063,Kentucky,Elliott County,7852,7852,7845,7782,7633,7550,7531,7546,7487,7490,7469,7485,7372,-7,-63,-149,-83,-19,15,-59,3,-21,16,-113,17,57,55,64,67,81,75,70,74,65,61,27,68,72,86,66,70,72,79,83,68,84,-10,-11,-17,-22,1,11,3,-9,-9,-3,-23,0,1,0,0,1,0,-1,-3,-3,-3,-2,4,-54,-137,-62,-20,5,-61,14,-8,21,-88,4,-53,-137,-62,-19,5,-62,11,-11,18,-90,-1,1,5,1,-1,-1,0,1,-1,1,0,1061,1061,1061,1061,1061,1054,1036,1060,1033,1034,1070,1032,7.2950662315,7.1359065845,8.4304814595,8.8853524302,10.744843139,9.9780482938,9.3476664218,9.8937094726,8.6933262003,8.2116174194,8.7028860306,9.3415504379,11.328459461,8.7527352298,9.2856669099,9.578926362,10.549509248,11.096998462,9.0945566404,11.307801037,-1.407819799,-2.205643853,-2.897978002,0.1326172005,1.4591762287,0.3991219318,-1.201842826,-1.20328899,-0.40123044,-3.096183617,0.1279836181,0,0,0.1326172005,0,-0.133040644,-0.400614275,-0.40109633,-0.40123044,-0.269233358,-6.911115377,-17.77489458,-8.167028914,-2.652344009,0.6632619221,-8.115479279,1.8695332844,-1.069590213,2.8086130801,-11.84626775,-6.783131759,-17.77489458,-8.167028914,-2.519726809,0.6632619221,-8.248519923,1.4689190091,-1.470686543,2.4073826401,-12.11550111 +050,3,6,21,065,Kentucky,Estill County,14672,14686,14722,14662,14512,14492,14451,14381,14332,14186,14164,14143,14109,36,-60,-150,-20,-41,-70,-49,-146,-22,-21,-34,46,170,152,158,153,158,162,122,149,149,145,24,188,182,180,213,197,200,211,219,181,194,22,-18,-30,-22,-60,-39,-38,-89,-70,-32,-49,0,0,0,0,0,0,1,1,1,0,0,14,-42,-124,5,22,-30,-11,-57,46,12,16,14,-42,-124,5,22,-30,-10,-56,47,12,16,0,0,4,-3,-3,-1,-1,-1,1,-1,-1,118,118,118,118,118,118,118,118,118,118,118,118,11.570922951,10.420237198,10.895048959,10.572504578,10.960044395,11.284087347,8.5559997195,10.511463845,10.527431377,10.264760017,12.796079499,12.47686296,12.412081092,14.718584805,13.665371809,13.930972034,14.797671646,15.44973545,12.788356237,13.733540988,-1.225156548,-2.056625763,-1.517032133,-4.146080227,-2.705327414,-2.646884686,-6.241671927,-4.938271605,-2.26092486,-3.468780971,0,0,0,0,0,0.0696548602,0.0701311452,0.0705467372,0,0,-2.858698611,-8.500719819,0.3447800303,1.5202294164,-2.081021088,-0.766203462,-3.997475279,3.2451499118,0.8478468223,1.1326631743,-2.858698611,-8.500719819,0.3447800303,1.5202294164,-2.081021088,-0.696548602,-3.927344134,3.315696649,0.8478468223,1.1326631743 +050,3,6,21,067,Kentucky,Fayette County,295803,295875,296868,301766,306062,310025,311992,316079,318190,321554,322597,323922,324735,993,4898,4296,3963,1967,4087,2111,3364,1043,1325,813,966,4001,3981,4049,4084,3959,4148,3973,4002,3856,3839,452,2074,2062,2219,2200,2358,2356,2509,2588,2342,2545,514,1927,1919,1830,1884,1601,1792,1464,1414,1514,1294,308,1244,1496,1789,1067,1478,1528,1292,352,517,421,178,1716,893,370,-922,1005,-1205,608,-712,-715,-920,486,2960,2389,2159,145,2483,323,1900,-360,-198,-499,-7,11,-12,-26,-62,3,-4,0,-11,9,18,12804,12828,12817,12582,12695,12293,13489,11762,12570,12947,12920,13048,13.367099096,13.099100403,13.144247485,13.131473899,12.606854957,13.079623945,12.420593237,12.425657959,11.928497074,11.836764268,6.9291086039,6.784814125,7.2035280731,7.0737616496,7.508705226,7.4290245937,7.843762505,8.035383008,7.2449533579,7.8469823034,6.4379904917,6.3142862784,5.9407194114,6.057712249,5.0981497315,5.6505993514,4.5768307323,4.3902749511,4.6835437164,3.9897819649,4.1561287865,4.9224451654,5.8076213262,3.4307744001,4.706474268,4.8181449826,4.0391156463,1.0929114447,1.599334281,1.2980666207,5.733052249,2.9383312384,1.2011290613,-2.9645492,3.2002751281,-3.799649675,1.9007603041,-2.210661786,-2.211845282,-2.836630145,9.8891810355,7.8607764039,7.0087503875,0.4662251996,7.9067493962,1.0184953072,5.9398759504,-1.117750341,-0.612511001,-1.538563524 +050,3,6,21,069,Kentucky,Fleming County,14348,14344,14398,14483,14527,14540,14476,14576,14489,14439,14490,14574,14603,54,85,44,13,-64,100,-87,-50,51,84,29,49,186,185,209,186,193,198,198,211,193,199,18,167,165,194,192,184,178,180,163,167,183,31,19,20,15,-6,9,20,18,48,26,16,0,0,-2,0,0,0,0,0,0,0,0,23,68,27,0,-58,94,-108,-68,4,57,13,23,68,25,0,-58,94,-108,-68,4,57,13,0,-2,-1,-2,0,-3,1,0,-1,1,0,22,22,22,22,22,22,22,22,22,22,22,22,12.880440428,12.754222682,14.38056903,12.820512821,13.286520721,13.62463444,13.689159292,14.587438211,13.281034957,13.640881516,11.564696513,11.375387797,13.348470774,13.23407775,12.666942035,12.248408739,12.444690265,11.268968855,11.491879989,12.544127223,1.3157439147,1.3788348845,1.0320982558,-0.41356493,0.6195786865,1.376225701,1.2444690265,3.318469356,1.7891549683,1.0967542928,0,-0.137883488,0,0,0,0,0,0,0,0,4.708978221,1.8614270941,0,-3.99779432,6.47115517,-7.431618785,-4.701327434,0.276539113,3.9223781998,0.8911128629,4.708978221,1.7235436057,0,-3.99779432,6.47115517,-7.431618785,-4.701327434,0.276539113,3.9223781998,0.8911128629 +050,3,6,21,071,Kentucky,Floyd County,39451,39454,39933,39760,39142,38487,38012,37545,37002,36301,35861,35515,34974,479,-173,-618,-655,-475,-467,-543,-701,-440,-346,-541,128,533,536,532,475,460,479,448,435,424,415,155,515,521,515,466,508,557,544,556,534,589,-27,18,15,17,9,-48,-78,-96,-121,-110,-174,2,7,14,12,10,14,3,0,-1,-2,-1,444,-198,-670,-701,-502,-435,-469,-609,-318,-233,-367,446,-191,-656,-689,-492,-421,-466,-609,-319,-235,-368,60,0,23,17,8,2,1,4,0,-1,1,790,1310,1327,986,683,673,672,676,674,673,666,668,13.376331673,13.586474361,13.706218037,12.418462986,12.176237807,12.85095309,12.223237794,12.056206868,11.880744228,11.774886862,12.924598145,13.206255862,13.268237386,12.183165793,13.446801752,14.943592633,14.842503035,15.409772456,14.963012777,16.711827377,0.4517335274,0.3802184989,0.4379806516,0.2352971934,-1.270563945,-2.092639543,-2.619265242,-3.353565589,-3.08226855,-4.936940516,0.1756741495,0.354870599,0.3091628129,0.261441326,0.3705811507,0.0804861363,0,-0.027715418,-0.056041246,-0.028373221,-4.969068802,-16.98309295,-18.06026098,-13.12435457,-11.51448575,-12.58266597,-16.61596388,-8.813502952,-6.528805201,-10.41297224,-4.793394652,-16.62822235,-17.75109817,-12.86291324,-11.1439046,-12.50217983,-16.61596388,-8.84121837,-6.584846447,-10.44134546 +050,3,6,21,073,Kentucky,Franklin County,49285,49262,49248,49312,49455,49482,49738,50090,50344,50564,50807,50887,51118,-14,64,143,27,256,352,254,220,243,80,231,149,560,534,601,595,584,600,573,606,550,544,155,489,470,513,493,532,568,602,571,550,576,-6,71,64,88,102,52,32,-29,35,0,-32,19,94,71,56,42,73,94,126,44,37,31,-20,-99,21,-114,118,231,130,126,166,44,230,-1,-5,92,-58,160,304,224,252,210,81,261,-7,-2,-13,-3,-6,-4,-2,-3,-2,-1,2,2061,2096,2127,1902,1801,1910,1910,1896,1873,1879,1878,1878,11.363636364,10.813328338,12.149145416,11.993549688,11.700124214,11.94814505,11.356879534,11.956082114,10.816764018,10.666143816,9.9228896104,9.5173489121,10.370235604,9.9375125983,10.658332332,11.310910648,11.931660522,11.265549319,10.816764018,11.293564041,1.4407467532,1.2959794263,1.7789098113,2.0560370893,1.041791882,0.6372344027,-0.574780989,0.6905327954,0,-0.627420224,1.9074675325,1.4377271761,1.1320335163,0.8466035074,1.4625155267,1.8718760579,2.4973242954,0.8680983713,0.7276732157,0.6078133425,-2.008928571,0.4252432493,-2.304496801,2.3785527111,4.6279600914,2.5887647609,2.4973242954,3.2750984009,0.8653411214,4.5095828636,-0.101461039,1.8629704253,-1.172463285,3.2251562185,6.0904756181,4.4606408188,4.9946485908,4.1431967723,1.5930143371,5.1173962061 +050,3,6,21,075,Kentucky,Fulton County,6813,6803,6797,6739,6557,6381,6259,6259,6181,6151,6049,5989,5952,-6,-58,-182,-176,-122,0,-78,-30,-102,-60,-37,18,96,75,74,79,78,83,59,56,69,61,35,103,102,130,97,84,84,117,98,87,102,-17,-7,-27,-56,-18,-6,-1,-58,-42,-18,-41,0,1,0,2,0,0,0,0,0,0,0,10,-52,-161,-123,-107,5,-77,29,-60,-42,5,10,-51,-161,-121,-107,5,-77,29,-60,-42,5,1,0,6,1,3,1,0,-1,0,0,-1,445,445,445,445,445,445,445,445,444,444,444,444,14.184397163,11.281588448,11.439171433,12.5,12.462054641,13.344051447,9.568602011,9.1803278689,11.463698289,10.216899757,15.218676123,15.342960289,20.095841707,15.348101266,13.420674229,13.504823151,18.975024327,16.06557377,14.454228277,17.083996315,-1.03427896,-4.061371841,-8.656670274,-2.848101266,-0.958619588,-0.160771704,-9.406422316,-6.885245902,-2.990529988,-6.867096558,0.1477541371,0,0.3091667955,0,0,0,0,0,0,0,-7.68321513,-24.21780987,-19.01375792,-16.93037975,0.7988496565,-12.37942122,4.703211158,-9.836065574,-6.977903306,0.8374507998,-7.535460993,-24.21780987,-18.70459113,-16.93037975,0.7988496565,-12.37942122,4.703211158,-9.836065574,-6.977903306,0.8374507998 +050,3,6,21,077,Kentucky,Gallatin County,8589,8581,8607,8617,8551,8577,8632,8610,8725,8716,8739,8842,8779,26,10,-66,26,55,-22,115,-9,23,103,-63,27,122,110,123,102,106,128,111,115,101,100,9,96,104,98,105,100,97,108,114,85,82,18,26,6,25,-3,6,31,3,1,16,18,6,19,2,14,7,9,7,4,1,2,2,2,-33,-75,-12,49,-35,76,-16,20,85,-82,8,-14,-73,2,56,-26,83,-12,21,87,-80,0,-2,1,-1,2,-2,1,0,1,0,-1,85,85,85,85,85,85,85,85,85,85,85,85,14.16627961,12.814538677,14.362447454,11.854262305,12.29555736,14.767810787,12.728627946,13.176740189,11.489676355,11.350093638,11.147236414,12.11556384,11.443250817,12.202917078,11.599582415,11.191231612,12.384610974,13.06215984,9.6695296058,9.3070767834,3.0190431955,0.6989748369,2.9191966371,-0.348654774,0.6959749449,3.5765791751,0.3440169715,0.1145803495,1.8201467493,2.0430168549,2.2062238737,0.2329916123,1.6347501168,0.8135278052,1.0439624174,0.8076146524,0.4586892953,0.1145803495,0.2275183437,0.2270018728,-3.831862517,-8.737185461,-1.401214386,5.6946946365,-4.059853845,8.768387655,-1.834757181,2.2916069894,9.6695296058,-9.307076783,-1.625638644,-8.504193849,0.233535731,6.5082224417,-3.015891428,9.5760023075,-1.376067886,2.4061873389,9.8970479495,-9.080074911 +050,3,6,21,079,Kentucky,Garrard County,16912,16905,16942,16869,17008,16995,16975,17212,17388,17452,17528,17684,17719,37,-73,139,-13,-20,237,176,64,76,156,35,49,167,193,170,166,196,209,182,208,186,182,19,153,151,170,182,171,163,195,196,184,196,30,14,42,0,-16,25,46,-13,12,2,-14,-2,5,4,6,-1,0,-1,-1,-1,-1,-1,11,-92,93,-18,0,211,130,79,65,156,49,9,-87,97,-12,-1,211,129,78,64,155,48,-2,0,0,-1,-3,1,1,-1,0,-1,1,109,109,109,109,109,109,109,109,109,109,109,109,9.8784419272,11.39416123,9.9991177249,9.7733294083,11.466346857,12.080924855,10.447761194,11.892510006,10.564580257,10.281614552,9.050309071,8.9146028279,9.9991177249,10.715337062,10.003802615,9.4219653179,11.194029851,11.206403659,10.45098262,11.07250798,0.8281328562,2.4795584025,0,-0.942007654,1.462544242,2.6589595376,-0.746268657,0.6861063465,0.1135976372,-0.790893427,0.2957617343,0.2361484193,0.3529100373,-0.058875478,0,-0.057803468,-0.057405281,-0.057175529,-0.056798819,-0.056492388,-5.442015912,5.4904507483,-1.058730112,0,12.343873402,7.5144508671,4.5350172216,3.7164093768,8.8606156992,2.7681269949,-5.146254178,5.7265991676,-0.705820075,-0.058875478,12.343873402,7.4566473988,4.4776119403,3.6592338479,8.8038168806,2.7116346072 +050,3,6,21,081,Kentucky,Grant County,24662,24660,24681,24771,24522,24567,24832,24746,24915,24998,25114,25120,25387,21,90,-249,45,265,-86,169,83,116,6,267,83,356,383,321,375,364,357,395,375,358,363,30,186,230,228,221,233,254,260,244,256,261,53,170,153,93,154,131,103,135,131,102,102,-1,-6,-5,-4,-8,-5,-6,-4,-5,-5,-3,-30,-74,-410,-40,123,-212,72,-46,-9,-93,169,-31,-80,-415,-44,115,-217,66,-50,-14,-98,166,-1,0,13,-4,-4,0,0,-2,-1,2,-1,457,457,457,457,457,457,456,456,456,456,456,456,14.397799887,15.539731808,13.078286378,15.182493573,14.683932389,14.37747931,15.827539919,14.966475096,14.253294581,14.374245154,7.5224460083,9.3319538271,9.2892501375,8.9475495455,9.3993303481,10.229355027,10.418127542,9.7381864623,10.192300036,10.335201061,6.8753538785,6.2077779806,3.7890362403,6.2349440272,5.2846020412,4.1481242826,5.4094123775,5.2282886335,4.0609945455,4.0390440929,-0.242659549,-0.202868561,-0.162969301,-0.323893196,-0.201702368,-0.241638308,-0.160278885,-0.199553001,-0.19906836,-0.118795414,-2.9928011,-16.63522204,-1.629693007,4.9798578919,-8.552180403,2.8996596927,-1.84320718,-0.359195402,-3.702671497,6.6921416833,-3.235460649,-16.8380906,-1.792662307,4.6559646956,-8.753882771,2.658021385,-2.003486066,-0.558748404,-3.901739857,6.5733462688 +050,3,6,21,083,Kentucky,Graves County,37121,37142,37254,37608,37566,37408,37584,37249,37217,37160,37260,37170,36818,112,354,-42,-158,176,-335,-32,-57,100,-90,-352,133,523,492,492,505,466,522,508,512,493,483,89,433,459,472,432,435,469,483,455,460,474,44,90,33,20,73,31,53,25,57,33,9,29,76,50,35,16,47,52,53,40,4,11,42,189,-124,-213,97,-417,-134,-134,4,-127,-369,71,265,-74,-178,113,-370,-82,-81,44,-123,-358,-3,-1,-1,0,-10,4,-3,-1,-1,0,-3,548,548,548,548,548,552,463,463,463,463,463,463,13.972375838,13.089632054,13.124549844,13.468103264,12.454398461,14.019821126,13.66013687,13.759742005,13.2473465,13.056171271,11.567951698,12.211668928,12.591031558,11.521228931,11.625886975,12.596352698,12.98788604,12.227895727,12.360607282,12.812888577,2.4044241404,0.8779631255,0.5335182863,1.9468743333,0.8285114856,1.4234684285,0.6722508302,1.5318462779,0.8867392181,0.2432826945,2.0304026075,1.3302471599,0.9336570011,0.4267121826,1.2561303168,1.3966105337,1.4251717601,1.0749798441,0.1074835416,0.2973455155,5.0492906949,-3.299012957,-5.68196975,2.5869426072,-11.14481579,-3.598957914,-3.60326445,0.1074979844,-3.412602445,-9.974590474,7.0796933023,-1.968765797,-4.748312748,3.0136547898,-9.888685473,-2.20234738,-2.17809269,1.1824778285,-3.305118904,-9.677244959 +050,3,6,21,085,Kentucky,Grayson County,25746,25749,25786,25754,25797,25954,26071,26143,26105,26281,26265,26435,26480,37,-32,43,157,117,72,-38,176,-16,170,45,85,305,340,343,327,353,335,318,294,324,314,93,312,336,311,319,307,344,312,367,313,326,-8,-7,4,32,8,46,-9,6,-73,11,-12,2,-3,-2,8,8,8,9,2,-1,-1,1,43,-21,44,119,106,21,-36,168,58,161,55,45,-24,42,127,114,29,-27,170,57,160,56,0,-1,-3,-2,-5,-3,-2,0,0,-1,1,768,768,768,768,768,768,768,768,767,766,765,766,11.835467598,13.190820741,13.255782497,12.570879385,13.521277818,12.823457357,12.140648265,11.190195257,12.29601518,11.868090334,12.107101281,13.035634614,12.019091419,12.263334935,11.759298272,13.167968152,11.91157943,13.968713128,11.878557875,12.321647926,-0.271633683,0.1551861264,1.2366910784,0.3075444498,1.7619795457,-0.344510795,0.2290688352,-2.77851787,0.4174573055,-0.453557592,-0.116414435,-0.077593063,0.3091727696,0.3075444498,0.3064312253,0.3445107947,0.0763562784,-0.038061889,-0.037950664,0.037796466,-0.814901048,1.70704739,4.5989449479,4.0749639596,0.8043819665,-1.378043179,6.4139273852,2.2075895406,6.110056926,2.0788056317,-0.931315483,1.6294543268,4.9081177175,4.3825084094,1.1108131919,-1.033532384,6.4902836636,2.169527652,6.0721062619,2.1166020977 +050,3,6,21,087,Kentucky,Green County,11258,11285,11260,11218,11304,11181,11043,10976,10991,11060,11007,10949,10995,-25,-42,86,-123,-138,-67,15,69,-53,-58,46,25,118,107,117,101,115,114,120,106,117,107,44,125,111,160,127,152,150,133,156,147,150,-19,-7,-4,-43,-26,-37,-36,-13,-50,-30,-43,2,5,7,9,-2,0,2,0,-1,-1,0,-7,-38,82,-89,-112,-30,50,82,-1,-28,90,-5,-33,89,-80,-114,-30,52,82,-2,-29,90,-1,-2,1,0,2,0,-1,0,-1,1,-1,113,113,113,113,113,113,113,113,113,113,113,113,10.499154729,9.5018204422,10.406937959,9.0892728582,10.44552432,10.379205171,10.883860142,9.6071056328,10.657678994,9.752096245,11.121985942,9.8570286831,14.231710029,11.429085673,13.806258232,13.65684891,12.062944991,14.138759233,13.390417198,13.67116296,-0.622831213,-0.355208241,-3.82477207,-2.339812815,-3.360733912,-3.277643738,-1.179084849,-4.5316536,-2.732738204,-3.919066715,0.4448794377,0.6216144215,0.8005336891,-0.179985601,0,0.1820913188,0,-0.090633072,-0.091091273,0,-3.381083726,7.281768937,-7.916388704,-10.07919366,-2.724919388,4.5522829699,7.4373044306,-0.090633072,-2.550555657,8.2026977762,-2.936204289,7.9033833585,-7.115855014,-10.25917927,-2.724919388,4.7343742887,7.4373044306,-0.181266144,-2.64164693,8.2026977762 +050,3,6,21,089,Kentucky,Greenup County,36910,36910,36889,36848,36698,36505,36326,36030,35852,35542,35371,35164,34865,-21,-41,-150,-193,-179,-296,-178,-310,-171,-207,-299,78,402,377,409,436,384,356,361,369,350,354,107,448,453,442,461,479,462,481,495,469,522,-29,-46,-76,-33,-25,-95,-106,-120,-126,-119,-168,0,3,1,-1,0,-1,1,0,-5,-4,3,15,2,-71,-162,-149,-197,-71,-188,-39,-85,-134,15,5,-70,-163,-149,-198,-70,-188,-44,-89,-131,-7,0,-4,3,-5,-3,-2,-2,-1,1,0,454,454,454,454,454,454,454,454,454,454,454,454,10.903616909,10.252087129,11.174405421,11.972923618,10.614185417,9.9051222837,10.112894641,10.407118582,9.9241511306,10.110097245,12.151294465,12.318820874,12.076007814,12.659444467,13.240090663,12.854400267,13.474521668,13.960768829,13.298362515,14.908109497,-1.247677557,-2.066733745,-0.901602393,-0.68652085,-2.625905246,-2.949277983,-3.361627027,-3.553650247,-3.374211384,-4.798012252,0.0813702754,0.0271938651,-0.027321285,0,-0.027641108,0.0278233772,0,-0.141017867,-0.11341887,0.0856787902,0.0542468503,-1.93076442,-4.426048113,-4.091664264,-5.445298248,-1.975459781,-5.26654901,-1.099939362,-2.410150989,-3.826985963,0.1356171257,-1.903570554,-4.453369397,-4.091664264,-5.472939355,-1.947636404,-5.26654901,-1.240957229,-2.523569859,-3.741307173 +050,3,6,21,091,Kentucky,Hancock County,8565,8565,8550,8590,8645,8631,8687,8648,8743,8786,8751,8716,8742,-15,40,55,-14,56,-39,95,43,-35,-35,26,24,104,115,104,104,124,135,106,117,90,100,31,83,65,95,82,75,83,78,90,91,98,-7,21,50,9,22,49,52,28,27,-1,2,0,-1,-1,0,0,0,0,0,0,0,0,-7,21,7,-22,36,-89,44,14,-62,-33,24,-7,20,6,-22,36,-89,44,14,-62,-33,24,-1,-1,-1,-1,-2,1,-1,1,0,-1,0,90,90,90,90,90,90,90,90,90,90,90,90,12.135355893,13.344937627,12.039824033,12.010624783,14.3063167,15.525271692,12.094243825,13.343217198,10.305146848,11.456065987,9.6849474912,7.5427908326,10.997916184,9.4699156947,8.6530141333,9.5451670404,8.8995379086,10.264013229,10.41964848,11.226944667,2.4504084014,5.8021467943,1.041907849,2.5407090888,5.6533025671,5.9801046518,3.1947059159,3.0792039688,-0.114501632,0.2291213197,-0.116686114,-0.116042936,0,0,0,0,0,0,0,0,2.4504084014,0.8123005512,-2.546885853,4.1575239635,-10.26824344,5.0600885515,1.597352958,-7.070764669,-3.778553844,2.7494558369,2.333722287,0.6962576153,-2.546885853,4.1575239635,-10.26824344,5.0600885515,1.597352958,-7.070764669,-3.778553844,2.7494558369 +050,3,6,21,093,Kentucky,Hardin County,105543,105542,106970,107542,108280,109072,108612,106415,107106,108314,110435,110970,111309,1428,572,738,792,-460,-2197,691,1208,2121,535,339,420,1796,1488,1632,1613,1520,1446,1419,1461,1407,1377,243,842,821,837,862,935,925,881,908,1027,1041,177,954,667,795,751,585,521,538,553,380,336,125,134,553,389,272,325,166,96,-37,-6,16,1043,-516,-464,-387,-1525,-3156,7,579,1607,159,-21,1168,-382,89,2,-1253,-2831,173,675,1570,153,-5,83,0,-18,-5,42,49,-3,-5,-2,2,8,3256,3254,3250,4359,4019,3332,3258,3182,3212,3252,3186,3190,16.744983964,13.789141051,15.017115094,14.819646828,14.137759444,13.544335218,13.174264228,13.35777535,12.709740069,12.389834397,7.8503766689,7.6081215075,7.7017924841,7.9197368663,8.6965822897,8.6642531648,8.179370532,8.3017522366,9.2771165963,9.366606832,8.8946072947,6.1810195439,7.3153226103,6.8999099612,5.4411771545,4.8800820528,4.994893696,5.0560231132,3.4326234728,3.0232275654,1.2493473559,5.1245934149,3.579447164,2.4990352989,3.0228761969,1.5548821896,0.8912821465,-0.338287261,-0.054199318,0.1439632174,-4.810919669,-4.299839683,-3.561043837,-14.01113541,-29.35445316,0.0655673212,5.3755454461,14.692638595,1.4362819268,-0.188951723,-3.561572313,0.8247537322,0.0184033273,-11.51210011,-26.33157696,1.6204495108,6.2668275926,14.354351334,1.3820826088,-0.044988505 +050,3,6,21,095,Kentucky,Harlan County,29278,29278,29223,29129,28686,28494,28018,27509,26986,26687,26338,25960,25566,-55,-94,-443,-192,-476,-509,-523,-299,-349,-378,-394,93,427,402,398,382,338,337,348,321,297,293,116,382,424,458,425,390,453,409,410,461,436,-23,45,-22,-60,-43,-52,-116,-61,-89,-164,-143,1,5,10,3,2,2,5,6,0,2,2,-32,-144,-442,-133,-443,-462,-414,-246,-261,-216,-252,-31,-139,-432,-130,-441,-460,-409,-240,-261,-214,-250,-1,0,11,-2,8,3,2,2,1,0,-1,627,627,627,627,627,627,627,627,627,627,627,627,14.635316699,13.906425668,13.920951382,13.519252548,12.174257568,12.368107166,12.967413783,12.107496464,11.357986921,11.372899119,13.092953112,14.667473839,16.019587268,15.041053228,14.047220271,16.625378475,15.240437464,15.464403583,17.629737275,16.923494935,1.5423635865,-0.761048171,-2.098635887,-1.52180068,-1.872962703,-4.257271309,-2.27302368,-3.356907119,-6.271750354,-5.550595816,0.1713737318,0.3459309868,0.1049317943,0.070781427,0.072037027,0.1835030737,0.2235760997,0,0.0764847604,0.0776307107,-4.935563477,-15.29014962,-4.651976215,-15.67808607,-16.64055324,-15.1940545,-9.166620088,-9.844413013,-8.260354124,-9.781469549,-4.764189745,-14.94421863,-4.547044421,-15.60730464,-16.56851622,-15.01055143,-8.943043989,-9.844413013,-8.183869364,-9.703838839 +050,3,6,21,097,Kentucky,Harrison County,18846,18839,18799,18680,18612,18564,18632,18642,18590,18737,18730,18838,18920,-40,-119,-68,-48,68,10,-52,147,-7,108,82,40,199,202,210,225,206,238,222,220,247,232,57,221,225,223,232,220,211,235,232,227,243,-17,-22,-23,-13,-7,-14,27,-13,-12,20,-11,0,16,33,32,3,3,4,4,1,-1,0,-22,-113,-79,-65,74,23,-82,157,4,89,93,-22,-97,-46,-33,77,26,-78,161,5,88,93,-1,0,1,-2,-2,-2,-1,-1,0,0,0,275,275,275,275,275,275,275,275,275,275,275,275,10.61928013,10.833422718,11.297611362,12.098075062,11.053281107,12.784701332,11.894875023,11.743667761,13.149488927,12.288786482,11.793270898,12.066931245,11.996987304,12.474459619,11.804474969,11.334336055,12.591421759,12.384231457,12.084752981,12.871444462,-1.173990768,-1.233508527,-0.699375941,-0.376384557,-0.751193862,1.4503652772,-0.696546736,-0.640563696,1.0647359455,-0.58265798,0.8538114678,1.7698165826,1.721540779,0.1613076675,0.1609701132,0.21486893,0.2143220725,0.053380308,-0.053236797,0,-6.030043491,-4.236833637,-3.496879707,3.9789224648,1.2341042013,-4.404813064,8.4121413454,0.213521232,4.7380749574,4.9261083744,-5.176232023,-2.467017055,-1.775338928,4.1402301323,1.3950743145,-4.189944134,8.6264634179,0.26690154,4.6848381601,4.9261083744 +050,3,6,21,099,Kentucky,Hart County,18199,18190,18184,18286,18399,18462,18508,18415,18531,18737,18868,19014,19013,-6,102,113,63,46,-93,116,206,131,146,-1,54,254,255,210,257,260,260,282,268,269,254,69,168,198,229,196,234,213,246,225,200,218,-15,86,57,-19,61,26,47,36,43,69,36,1,6,8,9,4,7,8,3,-1,1,0,10,10,52,75,-17,-125,61,168,88,76,-39,11,16,60,84,-13,-118,69,171,87,77,-39,-2,0,-4,-2,-2,-1,0,-1,1,0,2,227,227,227,227,227,227,227,227,227,227,227,227,13.929256923,13.902139839,11.394156425,13.903164728,14.083362674,14.074595355,15.133626704,14.253423747,14.201995671,13.358929182,9.2130518234,10.794602699,12.425056293,10.603191777,12.675026406,11.53034158,13.201674359,11.966493817,10.559104588,11.465537644,4.7162051001,3.1075371405,-1.030899867,3.299972951,1.4083362674,2.5442537758,1.9319523452,2.2869299295,3.6428910828,1.8933915376,0.3290375651,0.4361455636,0.4883209897,0.2163916689,0.3791674566,0.4330644725,0.1609960288,-0.053184417,0.0527955229,0,0.5483959419,2.8349461633,4.0693415805,-0.919664593,-6.770847439,3.3021166026,9.0157776108,4.680228693,4.0124597434,-2.051174166,0.877433507,3.2710917269,4.5576625702,-0.703272924,-6.391679983,3.7351810751,9.1767736396,4.627044276,4.0652552664,-2.051174166 +050,3,6,21,101,Kentucky,Henderson County,46250,46249,46263,46345,46436,46362,46396,46376,46254,45915,45566,45276,44740,14,82,91,-74,34,-20,-122,-339,-349,-290,-536,135,583,539,554,546,561,536,545,540,503,497,141,508,437,476,517,521,496,548,508,507,572,-6,75,102,78,29,40,40,-3,32,-4,-75,6,6,2,9,4,3,12,5,-1,1,3,19,2,-1,-159,9,-58,-173,-342,-382,-285,-464,25,8,1,-150,13,-55,-161,-337,-383,-284,-461,-5,-1,-12,-2,-8,-5,-1,1,2,-2,0,1165,1165,1165,1165,1165,1165,1165,1165,1164,1165,1163,1164,12.590704907,11.618758151,11.939912498,11.772569482,12.094166343,11.572924538,11.826102052,11.805730152,11.074172739,11.042481337,10.97097443,9.4200321186,10.258841785,11.147286487,11.231837192,10.709273454,11.891199861,11.106131328,11.162237731,12.70885176,1.6197304768,2.1987260323,1.6810707127,0.6252829945,0.862329151,0.863651085,-0.065097809,0.6995988238,-0.088064992,-1.666370423,0.1295784381,0.0431122751,0.1939696976,0.0862459303,0.0646746863,0.2590953255,0.1084963491,-0.021862463,0.022016248,0.0666548169,0.0431928127,-0.021556138,-3.426797991,0.1940533431,-1.250377269,-3.735290942,-7.421150278,-8.351460959,-6.274630677,-10.30927835,0.1727712509,0.0215561376,-3.232828294,0.2802992734,-1.185702583,-3.476195617,-7.312653929,-8.373323422,-6.252614429,-10.24262353 +050,3,6,21,103,Kentucky,Henry County,15416,15411,15372,15373,15335,15433,15550,15563,15837,15979,16049,16063,16067,-39,1,-38,98,117,13,274,142,70,14,4,38,193,167,181,159,172,187,192,190,165,161,49,182,152,179,162,164,190,176,199,185,190,-11,11,15,2,-3,8,-3,16,-9,-20,-29,1,12,13,14,2,0,2,4,0,1,2,-28,-23,-64,82,119,7,274,123,81,32,32,-27,-11,-51,96,121,7,276,127,81,33,34,-1,1,-2,0,-1,-2,1,-1,-2,1,-1,80,80,80,80,80,80,80,80,80,80,80,80,12.554886973,10.876644523,11.765470619,10.263692993,11.056471571,11.910828025,12.069399045,11.864618459,10.276532138,10.021786492,11.839323467,9.8997004038,11.635465419,10.457347578,10.54221708,12.101910828,11.063615791,12.426626702,11.522172397,11.826953003,0.7155635063,0.9769441188,0.1300052002,-0.193654585,0.5142544917,-0.191082803,1.0057832537,-0.562008243,-1.245640259,-1.805166511,0.7806147341,0.846684903,0.9100364015,0.1291030565,0,0.127388535,0.2514458134,0,0.062282013,0.1244942421,-1.49617824,-4.168294907,5.3302132085,7.6816318626,0.4499726802,17.452229299,7.7319587629,5.0580741851,1.9930244145,1.9919078743,-0.715563506,-3.321610004,6.24024961,7.8107349191,0.4499726802,17.579617834,7.9834045763,5.0580741851,2.0553064275,2.1164021164 +050,3,6,21,105,Kentucky,Hickman County,4902,4911,4868,4793,4747,4720,4690,4622,4622,4531,4424,4365,4364,-43,-75,-46,-27,-30,-68,0,-91,-107,-59,-1,7,41,45,35,33,44,49,47,37,37,37,33,63,52,54,63,74,57,72,63,61,70,-26,-22,-7,-19,-30,-30,-8,-25,-26,-24,-33,0,0,0,0,0,0,0,0,0,0,0,-17,-54,-37,-7,0,-39,9,-66,-82,-35,33,-17,-54,-37,-7,0,-39,9,-66,-82,-35,33,0,1,-2,-1,0,1,-1,0,1,0,-1,212,212,212,212,212,212,212,212,212,212,212,212,8.487734189,9.4339622642,7.3941058413,7.0138150903,9.4501718213,10.601471225,10.269856878,8.2635399218,8.4196154284,8.4774888303,13.042128144,10.901467505,11.408049012,13.390010627,15.89347079,12.332323669,15.732546706,14.070351759,13.880987598,16.038492382,-4.554393955,-1.467505241,-4.013943171,-6.376195537,-6.443298969,-1.730852445,-5.462689828,-5.806811837,-5.46137217,-7.561003551,0,0,0,0,0,0,0,0,0,0,-11.17896698,-7.756813417,-1.478821168,0,-8.37628866,1.9472090004,-14.42150115,-18.31379118,-7.964501081,7.5610035514,-11.17896698,-7.756813417,-1.478821168,0,-8.37628866,1.9472090004,-14.42150115,-18.31379118,-7.964501081,7.5610035514 +050,3,6,21,107,Kentucky,Hopkins County,46920,46917,46841,46849,46618,46436,46168,46068,45616,45303,44978,44660,44662,-76,8,-231,-182,-268,-100,-452,-313,-325,-318,2,124,562,553,523,534,580,527,498,546,537,523,177,509,603,611,584,637,621,643,607,545,598,-53,53,-50,-88,-50,-57,-94,-145,-61,-8,-75,4,13,19,33,23,35,34,24,9,17,15,-21,-56,-202,-120,-241,-73,-393,-191,-272,-328,60,-17,-43,-183,-87,-218,-38,-359,-167,-263,-311,75,-6,-2,2,-7,0,-5,1,-1,-1,1,2,1086,1086,1086,1086,1086,1086,1086,1086,1085,1084,1084,1084,11.997011421,11.833053377,11.240784921,11.532979137,12.576434364,11.496008028,10.954805926,12.095568281,11.981525692,11.710440877,10.865620664,12.902949704,13.132159821,12.612846097,13.812394293,13.546529384,14.144458254,13.446904664,12.160021419,13.389758402,1.1313907568,-1.069896327,-1.891374901,-1.07986696,-1.235959929,-2.050521356,-3.189652328,-1.351336383,-0.178495727,-1.679317525,0.2775109403,0.4065606043,0.7092655877,0.4967388018,0.7589227633,0.7416779373,0.5279424543,0.1993774991,0.3793034204,0.3358635051,-1.195431743,-4.322381161,-2.579147592,-5.204958749,-1.582896049,-8.572924392,-4.201542032,-6.025631085,-7.318324818,1.3434540203,-0.917920803,-3.915820557,-1.869882004,-4.708219947,-0.823973286,-7.831246455,-3.673599578,-5.826253586,-6.939021397,1.6793175254 +050,3,6,21,109,Kentucky,Jackson County,13494,13486,13476,13380,13303,13385,13304,13321,13351,13418,13415,13316,13340,-10,-96,-77,82,-81,17,30,67,-3,-99,24,34,154,154,170,162,175,167,183,162,150,158,67,170,169,157,136,162,162,160,175,180,173,-33,-16,-15,13,26,13,5,23,-13,-30,-15,0,0,0,0,0,0,0,0,0,0,0,22,-80,-64,70,-108,7,23,45,11,-69,39,22,-80,-64,70,-108,7,23,45,11,-69,39,1,0,2,-1,1,-3,2,-1,-1,0,0,110,110,110,110,110,110,110,110,110,110,110,110,11.468573131,11.542929955,12.739808153,12.13983289,13.145539906,12.522495501,13.67253166,12.074684158,11.222924694,11.854741897,12.660113196,12.667241315,11.76558753,10.191464648,12.169014085,12.147570486,11.954126041,13.043640294,13.467509633,12.980192077,-1.191540066,-1.124311359,0.9742206235,1.9483682416,0.9765258216,0.374925015,1.7184056184,-0.968956136,-2.244584939,-1.12545018,0,0,0,0,0,0,0,0,0,0,-5.957700328,-4.7970618,5.2458033573,-8.093221927,0.5258215962,1.724655069,3.3620979491,0.8198859613,-5.162545359,2.9261704682,-5.957700328,-4.7970618,5.2458033573,-8.093221927,0.5258215962,1.724655069,3.3620979491,0.8198859613,-5.162545359,2.9261704682 +050,3,6,21,111,Kentucky,Jefferson County,741096,741095,742096,746458,751802,759427,762038,765322,767770,770383,768706,767785,767452,1001,4362,5344,7625,2611,3284,2448,2613,-1677,-921,-333,2554,10079,9933,10033,9974,10042,9979,9897,9819,9587,9433,1778,7219,7213,7497,7326,7730,8041,8268,8086,8041,8281,776,2860,2720,2536,2648,2312,1938,1629,1733,1546,1152,464,1838,2561,3302,1846,2684,2565,2392,708,1220,980,-148,-310,188,1815,-1696,-1604,-2011,-1355,-4097,-3687,-2492,316,1528,2749,5117,150,1080,554,1037,-3389,-2467,-1512,-91,-26,-125,-28,-187,-108,-44,-53,-21,0,27,14153,14153,14150,14528,14883,14935,15190,15823,16602,16675,17306,17013,13.542001164,13.259380882,13.277934714,13.111047576,13.149486696,13.018135898,12.868680814,12.75949604,12.479083835,12.288656409,9.6993458081,9.6285023961,9.9217259595,9.6301919532,10.122040645,10.48991189,10.750556024,10.50751451,10.466706281,10.787910922,3.8426553555,3.6308784857,3.3562087546,3.4808556227,3.0274460507,2.5282240074,2.1181247899,2.2519815293,2.0123775538,1.5007454875,2.4695106795,3.4186322801,4.369953197,2.4266085648,3.5145610727,3.3461788334,3.1102237554,0.9200247679,1.5880340334,1.2766758487,-0.416511594,0.2509577777,2.4020184896,-2.229430187,-2.10035617,-2.623456387,-1.76185334,-5.323928636,-4.799247116,-3.246404301,2.052999085,3.6695900578,6.7719716866,0.1971783774,1.4142049026,0.7227224459,1.3483704157,-4.403903868,-3.211213082,-1.969728452 +050,3,6,21,113,Kentucky,Jessamine County,48586,48579,48682,48892,49469,50124,50877,51822,52259,53274,53777,54012,54057,103,210,577,655,753,945,437,1015,503,235,45,165,661,688,653,690,653,703,632,650,610,619,118,367,378,387,443,474,482,478,497,457,492,47,294,310,266,247,179,221,154,153,153,127,20,32,97,141,91,124,133,126,39,23,19,40,-117,175,249,414,638,83,736,310,60,-104,60,-85,272,390,505,762,216,862,349,83,-85,-4,1,-5,-1,1,4,0,-1,1,-1,3,1779,1768,1758,1684,1760,1756,1767,1722,1688,1718,1677,1634,13.54869125,13.989284371,13.113371422,13.663231057,12.716774263,13.508709563,11.977296201,12.14374457,11.318409114,11.455644079,7.5224957468,7.6859730991,7.7716305363,8.7721903744,9.2308591126,9.2620170828,9.0587778231,9.2852939253,8.4795294511,9.10529384,6.0261955029,6.3033112717,5.3417408854,4.8910406828,3.4859151501,4.2466924799,2.9185183781,2.858450645,2.838879663,2.3503502392,0.6559124357,1.9723264302,2.8315243039,1.8019623568,2.4148239029,2.5557018092,2.387878673,0.7286246742,0.4267596879,0.3516272011,-2.398179843,3.5583208792,5.0003514303,8.1979386343,12.424658468,1.5949116553,13.948243677,5.7916320259,1.1132861424,-1.924696259,-1.742267407,5.5306473094,7.8318757342,9.9999009911,14.839482371,4.1506134645,16.33612235,6.5202567001,1.5400458303,-1.573069058 +050,3,6,21,115,Kentucky,Johnson County,23356,23372,23398,23430,23419,23474,23266,23144,22895,22618,22432,22188,22002,26,32,-11,55,-208,-122,-249,-277,-186,-244,-186,74,278,330,305,304,273,269,251,260,222,223,104,260,301,291,282,283,310,303,357,329,321,-30,18,29,14,22,-10,-41,-52,-97,-107,-98,0,-1,-1,1,-1,-2,-2,-3,-3,-3,-3,55,16,-34,43,-232,-108,-206,-221,-86,-134,-84,55,15,-35,44,-233,-110,-208,-224,-89,-137,-87,1,-1,-5,-3,3,-2,0,-1,0,0,-1,528,528,528,528,529,530,531,528,528,528,528,528,11.873238234,14.087814041,13.008338131,13.008130081,11.764705882,11.685744695,11.029815657,11.5427303,9.9506947557,10.092781172,11.104467413,12.849794019,12.411234086,12.066752246,12.19564749,13.466843328,13.314877068,15.849056604,14.746750336,14.528173795,0.7687708209,1.2380200218,0.5971040454,0.9413778348,-0.430941607,-1.781098634,-2.285061411,-4.306326304,-4.79605558,-4.435392623,-0.04270949,-0.042690346,0.042650289,-0.042789902,-0.086188321,-0.08688286,-0.131830466,-0.13318535,-0.134468848,-0.135777325,0.6833518408,-1.45147175,1.8339624251,-9.927257167,-4.65416936,-8.948934599,-9.711510997,-3.817980022,-6.006275213,-3.801765105,0.6406423507,-1.494162095,1.8766127141,-9.970047069,-4.740357682,-9.035817459,-9.843341463,-3.951165372,-6.140744061,-3.93754243 +050,3,6,21,117,Kentucky,Kenton County,159720,159728,159967,160562,161774,163228,163741,164627,165144,165835,166501,167333,167949,239,595,1212,1454,513,886,517,691,666,832,616,632,2380,2290,2383,2371,2333,2212,2198,2255,2237,2180,305,1347,1394,1417,1435,1511,1499,1565,1545,1486,1612,327,1033,896,966,936,822,713,633,710,751,568,36,130,192,205,121,148,180,151,35,66,57,-110,-563,150,297,-516,-66,-366,-83,-73,12,-12,-74,-433,342,502,-395,82,-186,68,-38,78,45,-14,-5,-26,-14,-28,-18,-10,-10,-6,3,3,2332,2349,2373,2402,2415,2419,2440,2456,2514,2566,2680,2661,14.850450349,14.208775936,14.664525141,14.502903945,14.209667203,13.41537006,13.28180942,13.570603245,13.401870391,13.00397874,8.4048557229,8.6493596744,8.7199463388,8.7775905361,9.203089217,9.091157197,9.4567933313,9.2978190747,8.9026282524,9.6157861144,6.4455946264,5.5594162613,5.9445788026,5.7253134089,5.0065779857,4.3242128629,3.8250160886,4.2727841702,4.4992421383,3.3881926259,0.8111590527,1.1913034846,1.2615306983,0.7401313274,0.9014276665,1.0916666414,0.9124445962,0.2106302056,0.3954061,0.3400122882,-3.512942667,0.9307058473,1.8276810604,-3.15626252,-0.401988013,-2.219722171,-0.501542394,-0.439314429,0.0718920182,-0.071581534,-2.701783614,2.1220093319,3.0892117587,-2.416131193,0.4994396531,-1.128055529,0.4109022023,-0.228684223,0.4672981182,0.2684307538 +050,3,6,21,119,Kentucky,Knott County,16346,16360,16350,16306,16122,16090,15943,15681,15498,15243,15090,14861,14512,-10,-44,-184,-32,-147,-262,-183,-255,-153,-229,-349,50,178,161,188,206,164,170,154,141,147,134,53,206,231,212,184,196,200,219,193,195,204,-3,-28,-70,-24,22,-32,-30,-65,-52,-48,-70,0,-1,2,4,3,3,3,-2,-4,-4,-3,-4,-14,-121,-9,-173,-233,-158,-189,-97,-176,-275,-4,-15,-119,-5,-170,-230,-155,-191,-101,-180,-278,-3,-1,5,-3,1,0,2,1,0,-1,-1,677,707,738,751,777,792,813,812,814,816,816,764,10.901518863,9.929690391,11.672668571,12.861736334,10.371869466,10.90477565,10.019192609,9.2968054594,9.8160328537,9.1240254656,12.616364527,14.246947083,13.162796473,11.488152842,12.395648874,12.829147824,14.248072607,12.725414565,13.021268071,13.890307425,-1.714845664,-4.317256692,-1.490127903,1.373583492,-2.023779408,-1.924372174,-4.228879997,-3.428609106,-3.205235218,-4.76628196,-0.061244488,0.1233501912,0.2483546504,0.1873068398,0.1897293195,0.1924372174,-0.130119385,-0.263739162,-0.267102935,-0.204269227,-0.857422832,-7.462686567,-0.558797963,-10.8013611,-14.73564381,-10.13502678,-12.29628184,-6.395674678,-11.75252913,-18.72467913,-0.91866732,-7.339336376,-0.310443313,-10.61405426,-14.5459145,-9.942589563,-12.42640122,-6.65941384,-12.01963207,-18.92894835 +050,3,6,21,121,Kentucky,Knox County,31883,31882,31846,31875,31493,31637,31542,31467,31481,31461,31326,31151,31022,-36,29,-382,144,-95,-75,14,-20,-135,-175,-129,100,379,417,451,410,391,384,375,427,394,396,127,387,356,355,384,388,428,422,406,418,470,-27,-8,61,96,26,3,-44,-47,21,-24,-74,1,-2,-5,-5,31,32,31,13,-4,4,5,-6,41,-445,57,-152,-106,28,16,-152,-154,-63,-5,39,-450,52,-121,-74,59,29,-156,-150,-58,-4,-2,7,-4,0,-4,-1,-2,0,-1,3,642,651,658,672,668,652,685,692,701,701,679,656,11.895607414,13.161217018,14.28797719,12.978996185,12.410925423,12.200546483,11.915731944,13.60154172,12.612641452,12.73864861,12.146702029,11.235955056,11.24663393,12.155937891,12.315700932,13.598525767,13.409170347,12.932613439,13.38092418,15.119103148,-0.251094616,1.9252619619,3.0413432599,0.8230582947,0.0952244917,-1.397979284,-1.493438404,0.6689282813,-0.768282728,-2.380454538,-0.062773654,-0.157808358,-0.158403295,0.981338736,1.0157279119,0.9849399504,0.4130787074,-0.127414911,0.1280471213,0.1608415228,1.2868599049,-14.04494382,1.8057975606,-4.811725415,-3.364598708,0.889623181,0.5084045629,-4.841766608,-4.929814172,-2.026603188,1.224086251,-14.20275218,1.6473942658,-3.830386679,-2.348870796,1.8745631315,0.9214832703,-4.969181518,-4.80176705,-1.865761665 +050,3,6,21,123,Kentucky,Larue County,14193,14190,14181,14190,14057,14029,14120,14123,14019,14204,14300,14393,14431,-9,9,-133,-28,91,3,-104,185,96,93,38,34,135,146,167,166,147,152,166,166,174,157,50,180,134,177,170,167,169,165,185,160,171,-16,-45,12,-10,-4,-20,-17,1,-19,14,-14,3,-2,-1,1,-1,0,-1,0,-2,-1,-1,6,56,-146,-16,97,25,-87,185,117,81,52,9,54,-147,-15,96,25,-88,185,115,80,51,-2,0,2,-3,-1,-2,1,-1,0,-1,1,313,313,313,313,313,313,313,313,313,313,313,313,9.5167600719,10.337380961,11.892045859,11.794379907,10.409659031,10.802359463,11.763455338,11.647488072,12.128393685,10.893699695,12.689013429,9.4877332106,12.604144414,12.078581832,11.825939171,12.010518087,11.692591149,12.980634297,11.152545917,11.865112406,-3.172253357,0.8496477502,-0.712098554,-0.284201925,-1.41628014,-1.208158624,0.0708641888,-1.333146225,0.9758477677,-0.971412712,-0.140989038,-0.070803979,0.0712098554,-0.071050481,0,-0.071068154,0,-0.140331182,-0.069703412,-0.069386622,3.9476930669,-10.33738096,-1.139357687,6.8918966926,1.7703501753,-6.182929429,13.109874925,8.2093741229,5.6459763705,3.6081043575,3.8067040288,-10.40818494,-1.068147832,6.8208462112,1.7703501753,-6.253997584,13.109874925,8.0690429413,5.5762729586,3.5387177352 +050,3,6,21,125,Kentucky,Laurel County,58849,58845,58993,59364,59542,59714,59913,59937,60080,60343,60652,60842,61238,148,371,178,172,199,24,143,263,309,190,396,150,727,743,762,687,763,739,793,737,720,713,115,565,617,513,565,603,610,656,714,646,737,35,162,126,249,122,160,129,137,23,74,-24,11,45,38,35,-6,-2,-5,-4,-5,-4,-4,100,164,28,-102,96,-128,23,134,292,120,424,111,209,66,-67,90,-130,18,130,287,116,420,2,0,-14,-10,-13,-6,-4,-4,-1,0,0,699,699,699,699,698,698,698,696,696,695,695,695,12.28486697,12.497266749,12.779231234,11.485701388,12.732582395,12.314922053,13.170241565,12.182321584,11.852437157,11.680865007,9.5473862974,10.377945604,8.6033407124,9.4460280706,10.062578223,10.165226593,10.89492871,11.802140584,10.634270005,12.074049803,2.7374806729,2.1193211444,4.1758905212,2.0396733179,2.6700041719,2.1496954598,2.2753128555,0.3801809992,1.2181671523,-0.393184797,0.760411298,0.6391603451,0.5869725632,-0.100311803,-0.033375052,-0.083321529,-0.066432492,-0.082648043,-0.065846873,-0.065530799,2.7712767306,0.4709602543,-1.710605756,1.6049888403,-2.136003338,0.3832790355,2.2254884864,4.8266457292,1.9754061929,6.9462647444,3.5316880286,1.1101205995,-1.123633192,1.5046770378,-2.16937839,0.299957506,2.1590559943,4.7439976859,1.9095593198,6.880733945 +050,3,6,21,127,Kentucky,Lawrence County,15860,15849,15856,15931,15881,15893,15873,15861,15843,15757,15589,15395,15436,7,75,-50,12,-20,-12,-18,-86,-168,-194,41,56,198,215,178,219,216,206,202,194,213,214,64,194,206,194,188,224,214,190,238,214,223,-8,4,9,-16,31,-8,-8,12,-44,-1,-9,0,0,5,20,13,25,11,14,13,4,5,15,72,-61,10,-64,-27,-20,-111,-137,-198,45,15,72,-56,30,-51,-2,-9,-97,-124,-194,50,0,-1,-3,-2,0,-2,-1,-1,0,1,0,108,108,108,108,108,108,108,108,108,108,108,108,12.45792305,13.516911857,11.204129162,13.788327142,13.613159387,12.995205652,12.784810127,12.377974861,13.749031758,13.882131621,12.206247837,12.95108764,12.211241896,11.836554807,14.117350476,13.499873833,12.025316456,15.185350603,13.813581203,14.465959586,0.2516752131,0.5658242173,-1.007112734,1.9517723352,-0.504191088,-0.504668181,0.7594936709,-2.807375742,-0.064549445,-0.583827965,0,0.3143467874,1.2588909171,0.8184851728,1.5755971513,0.6939187484,0.8860759494,0.8294519237,0.2581977795,0.3243488696,4.5301538365,-3.835030806,0.6294454586,-4.029465466,-1.701644923,-1.261670452,-7.025316456,-8.741147196,-12.78079009,2.9191398268,4.5301538365,-3.520684019,1.8883363757,-3.210980293,-0.126047772,-0.567751703,-6.139240506,-7.911695272,-12.52259231,3.2434886964 +050,3,6,21,129,Kentucky,Lee County,7887,7883,7714,7706,7582,7147,7069,7023,6885,6860,7038,7390,7268,-169,-8,-124,-435,-78,-46,-138,-25,178,352,-122,11,67,68,82,78,63,91,75,70,76,75,15,95,107,98,111,91,100,110,107,102,120,-4,-28,-39,-16,-33,-28,-9,-35,-37,-26,-45,-1,-2,-1,-1,-1,4,2,2,-2,-1,0,-185,22,-87,-436,-42,-22,-132,9,216,377,-77,-186,20,-88,-437,-43,-18,-130,11,214,376,-77,21,0,3,18,-2,0,1,-1,1,2,0,1016,848,849,843,450,451,454,449,445,706,1011,990,8.6900129702,8.8958660387,11.134496571,10.973550929,8.9412432586,13.085993673,10.913059294,10.073391855,10.535070696,10.233319689,12.321660182,13.997906855,13.307081268,15.616207091,12.915129151,14.380212827,16.005820298,15.397898978,14.139173829,16.373311502,-3.631647211,-5.102040816,-2.172584697,-4.642656162,-3.973885893,-1.294219154,-5.092761004,-5.324507123,-3.604103133,-6.139991813,-0.259403372,-0.130821559,-0.135786544,-0.14068655,0.5676979847,0.2876042565,0.2910149145,-0.287811196,-0.138619351,0,2.8534370947,-11.38147567,-59.20293299,-5.908835115,-3.122338916,-18.98188093,1.3095671153,31.083609152,52.259495426,-10.50620821,2.5940337224,-11.51229723,-59.33871953,-6.049521666,-2.554640931,-18.69427668,1.6005820298,30.795797957,52.120876074,-10.50620821 +050,3,6,21,131,Kentucky,Leslie County,11310,11310,11278,11241,11147,10995,10841,10655,10431,10323,10135,9880,9637,-32,-37,-94,-152,-154,-186,-224,-108,-188,-255,-243,34,156,151,138,139,143,115,108,101,109,96,64,167,143,179,150,159,159,151,173,163,178,-30,-11,8,-41,-11,-16,-44,-43,-72,-54,-82,0,-3,0,-1,0,2,1,2,1,2,2,-1,-23,-105,-110,-146,-174,-181,-69,-116,-203,-162,-1,-26,-105,-111,-146,-172,-180,-67,-115,-201,-160,-1,0,3,0,3,2,0,2,-1,0,-1,227,227,227,227,227,227,227,227,227,227,227,227,13.854966917,13.489369305,12.464998645,12.731269463,13.304800893,10.907711278,10.407632264,9.8738879656,10.891831127,9.8375774965,14.831919712,12.774700733,16.168367808,13.738779996,14.793449944,15.081096462,14.551411776,16.912699189,16.287784162,18.240508275,-0.976952795,0.7146685724,-3.703369163,-1.007510533,-1.488649051,-4.173385184,-4.143779512,-7.038811223,-5.395953035,-8.402930778,-0.266441671,0,-0.090326077,0,0.1860811314,0.0948496633,0.1927339308,0.097761267,0.1998501124,0.2049495312,-2.042719481,-9.380025013,-9.935868485,-13.37241253,-16.18905843,-17.16778905,-6.649320613,-11.34030697,-20.28478641,-16.60091203,-2.309161153,-9.380025013,-10.02619456,-13.37241253,-16.0029773,-17.07293939,-6.456586682,-11.2425457,-20.0849363,-16.39596249 +050,3,6,21,133,Kentucky,Letcher County,24519,24511,24534,24375,24009,23536,23352,23043,22765,22297,21847,21560,21213,23,-159,-366,-473,-184,-309,-278,-468,-450,-287,-347,71,312,283,281,289,260,278,255,254,230,228,104,327,310,340,312,282,322,371,333,368,342,-33,-15,-27,-59,-23,-22,-44,-116,-79,-138,-114,0,7,4,4,0,2,2,2,1,1,1,56,-152,-354,-423,-163,-290,-239,-356,-373,-151,-232,56,-145,-350,-419,-163,-288,-237,-354,-372,-150,-231,0,1,11,5,2,1,3,2,1,1,-2,243,243,243,243,243,243,243,243,243,243,243,243,12.758388027,11.698082011,11.820380692,12.32724791,11.208104322,12.137617883,11.317740003,11.507792679,10.597369088,10.660930961,13.371772066,12.814153439,14.302239983,13.308309162,12.15648238,14.058679707,16.466202122,15.086988039,16.955790541,15.991396442,-0.61338404,-1.116071429,-2.481859291,-0.981061252,-0.948378058,-1.921061823,-5.148462119,-3.579195361,-6.358421453,-5.330465481,0.2862458852,0.1653439153,0.1682616469,0,0.0862161871,0.087320992,0.0887665883,0.0453062704,0.0460755178,0.0467584691,-6.215624936,-14.63293651,-17.79366916,-6.952738441,-12.50134713,-10.43485854,-15.80045271,-16.89923885,-6.957403184,-10.84796484,-5.929379051,-14.46759259,-17.62540751,-6.952738441,-12.41513094,-10.34753755,-15.71168612,-16.85393258,-6.911327666,-10.80120637 +050,3,6,21,135,Kentucky,Lewis County,13870,13882,13836,13838,13840,13755,13832,13666,13514,13369,13269,13309,13262,-46,2,2,-85,77,-166,-152,-145,-100,40,-47,25,167,162,184,164,153,127,149,154,177,168,60,154,133,172,127,175,184,194,181,169,169,-35,13,29,12,37,-22,-57,-45,-27,8,-1,0,-1,0,0,0,0,0,0,0,0,0,-10,-9,-25,-98,41,-146,-94,-101,-73,31,-44,-10,-10,-25,-98,41,-146,-94,-101,-73,31,-44,-1,-1,-2,1,-1,2,-1,1,0,1,-2,139,139,139,139,139,139,139,139,139,139,139,139,12.069090121,11.706048125,13.33574923,11.889658172,11.128082042,9.3451066961,11.085072351,11.562429612,13.319286628,12.645365248,11.129580111,9.6105209914,12.466026454,9.207235292,12.728198414,13.539367182,14.432912993,13.589608829,12.717284973,12.720635279,0.9395100094,2.0955271335,0.8697227759,2.6824228803,-1.600116372,-4.194260486,-3.347840643,-2.027179218,0.6020016555,-0.075270031,-0.072270001,0,0,0,0,0,0,0,0,0,-0.650430007,-1.806488908,-7.102736003,2.9724145431,-10.61895411,-6.916850625,-7.514042332,-5.480891959,2.3327564151,-3.311881374,-0.722700007,-1.806488908,-7.102736003,2.9724145431,-10.61895411,-6.916850625,-7.514042332,-5.480891959,2.3327564151,-3.311881374 +050,3,6,21,137,Kentucky,Lincoln County,24742,24741,24730,24728,24412,24447,24438,24351,24367,24500,24614,24519,24466,-11,-2,-316,35,-9,-87,16,133,114,-95,-53,86,327,295,345,308,324,320,363,347,324,317,79,250,275,277,281,321,278,308,288,325,317,7,77,20,68,27,3,42,55,59,-1,0,0,-1,-1,-1,0,-1,-2,-2,-2,-2,-2,-15,-79,-342,-29,-31,-87,-21,80,59,-92,-52,-15,-80,-343,-30,-31,-88,-23,78,57,-94,-54,-3,1,7,-3,-5,-2,-3,0,-2,0,1,219,219,219,219,219,219,219,219,219,219,219,219,13.223341017,12.006512007,14.122270206,12.601002352,13.281682346,13.136828277,14.856651728,14.13039052,13.188691918,12.942737573,10.109587933,11.192511193,11.338750281,11.496369029,13.158703806,11.412619566,12.605643891,11.727816916,13.229397757,12.942737573,3.1137530834,0.814000814,2.7835199247,1.1046333231,0.1229785402,1.7242087114,2.2510078376,2.4025736043,-0.040705839,0,-0.040438352,-0.040700041,-0.040934117,0,-0.040992847,-0.082105177,-0.08185483,-0.081443173,-0.081411679,-0.08165765,-3.194629787,-13.91941392,-1.18708938,-1.268282704,-3.566377667,-0.862104356,3.2741932183,2.4025736043,-3.744937211,-2.123098908,-3.235068139,-13.96011396,-1.228023496,-1.268282704,-3.607370514,-0.944209532,3.1923383879,2.3211304312,-3.82634889,-2.204756558 +050,3,6,21,139,Kentucky,Livingston County,9519,9519,9520,9504,9438,9333,9330,9290,9199,9249,9222,9148,9041,1,-16,-66,-105,-3,-40,-91,50,-27,-74,-107,23,101,98,109,109,95,97,92,107,81,82,46,139,115,128,130,114,140,133,131,115,134,-23,-38,-17,-19,-21,-19,-43,-41,-24,-34,-52,0,1,5,5,0,0,0,0,0,0,0,23,21,-52,-92,21,-21,-47,90,-2,-40,-55,23,22,-47,-87,21,-21,-47,90,-2,-40,-55,1,0,-2,1,-3,0,-1,1,-1,0,0,69,69,69,69,69,69,69,69,69,69,69,69,10.618166526,10.347376201,11.613659368,11.680865884,10.204081633,10.492725404,9.9739809193,11.585728981,8.818726184,9.0164385068,14.613120269,12.142329215,13.638058708,13.931307935,12.244897959,15.144139759,14.418907199,14.184397163,12.520413718,14.734179999,-3.994953743,-1.794953014,-2.024399339,-2.250442051,-2.040816327,-4.651414354,-4.444926279,-2.598668183,-3.701687534,-5.717741492,0.1051303616,0.5279273572,0.5327366683,0,0,0,0,0,0,0,2.2077375946,-5.490444515,-9.802354696,2.2504420511,-2.255639098,-5.084104062,9.7571552472,-0.216555682,-4.354926511,-6.047611194,2.3128679563,-4.962517158,-9.269618028,2.2504420511,-2.255639098,-5.084104062,9.7571552472,-0.216555682,-4.354926511,-6.047611194 +050,3,6,21,141,Kentucky,Logan County,26835,26835,26854,26851,26731,26989,26828,26761,26697,27017,27003,27111,27416,19,-3,-120,258,-161,-67,-64,320,-14,108,305,82,339,320,399,355,329,353,324,348,377,377,50,307,294,307,297,342,285,331,323,344,318,32,32,26,92,58,-13,68,-7,25,33,59,6,17,-1,-2,-3,-1,-3,-1,-3,-3,-2,-15,-51,-148,168,-217,-49,-128,329,-35,78,249,-9,-34,-149,166,-220,-50,-131,328,-38,75,247,-4,-1,3,0,1,-4,-1,-1,-1,0,-1,277,277,277,277,277,277,277,277,277,277,277,277,12.624522856,11.944309656,14.854802681,13.192857276,12.278639273,13.206629504,12.063893957,12.884116994,13.933547696,13.828011811,11.432827483,10.973834497,11.429635145,11.037404538,12.763813469,10.662576228,12.324533641,11.958533876,12.713900285,11.663946302,1.1916953729,0.9704751596,3.4251675354,2.155452738,-0.485174196,2.5440532755,-0.260639684,0.9255831174,1.219647411,2.1640655088,0.6330881668,-0.037325968,-0.074460164,-0.111488935,-0.037321092,-0.112237645,-0.037234241,-0.111069974,-0.110877037,-0.073358153,-1.899264501,-5.524243216,6.2546537602,-8.064366278,-1.828733509,-4.788806166,12.25006516,-1.295816364,2.8828029715,9.1330900288,-1.266176334,-5.561569184,6.1801935964,-8.175855213,-1.866054601,-4.90104381,12.212830919,-1.406886338,2.7719259341,9.059731876 +050,3,6,21,143,Kentucky,Lyon County,8314,8319,8329,8435,8446,8454,8413,8478,8248,8293,8198,8256,8133,10,106,11,8,-41,65,-230,45,-95,58,-123,17,59,62,58,53,46,47,55,52,48,45,19,105,101,104,117,135,119,130,103,110,131,-2,-46,-39,-46,-64,-89,-72,-75,-51,-62,-86,0,0,1,1,-1,-1,8,18,11,-4,-4,12,150,49,55,24,152,-168,102,-55,125,-33,12,150,50,56,23,151,-160,120,-44,121,-37,0,2,0,-2,0,3,2,0,0,-1,0,1123,1123,1222,1205,1214,1218,1385,1175,1212,1154,1180,1123,7.0388928657,7.3455364019,6.8639053254,6.2844607814,5.4466875851,5.6199928255,6.6501420712,6.3064701959,5.8344475507,5.4914881933,12.526843236,11.966115751,12.307692308,13.873243612,15.984844,14.229343537,15.718517623,12.491662119,13.37060897,15.986332296,-5.48795037,-4.62057935,-5.443786982,-7.58878283,-10.53815641,-8.609350711,-9.068375552,-6.185191923,-7.53616142,-10.4948441,0,0.1184763936,0.1183431953,-0.118574732,-0.118406252,0.9565945235,2.1764101324,1.334061003,-0.486203963,-0.488132284,17.895490336,5.8053432854,6.5088757396,2.8457935614,17.997750281,-20.08848499,12.33299075,-6.670305015,15.19387383,-4.027091342,17.895490336,5.9238196789,6.6272189349,2.7272188297,17.879344029,-19.13189047,14.509400883,-5.336244012,14.707669868,-4.515223626 +050,3,6,21,145,Kentucky,McCracken County,65565,65547,65523,65808,65609,65368,65356,64990,65348,65420,65391,65622,65644,-24,285,-199,-241,-12,-366,358,72,-29,231,22,168,775,775,788,778,755,829,817,738,763,735,147,797,804,843,802,814,802,810,803,795,863,21,-22,-29,-55,-24,-59,27,7,-65,-32,-128,1,-16,6,27,10,20,23,23,-5,1,-3,-36,324,-161,-206,16,-322,313,46,44,261,151,-35,308,-155,-179,26,-302,336,69,39,262,148,-10,-1,-15,-7,-14,-5,-5,-4,-3,1,2,1189,1189,1189,1189,1189,1189,1189,1189,1190,1190,1190,1190,11.802240141,11.794516691,12.032646953,11.902940546,11.584551885,12.720772146,12.495411722,11.283454755,11.647699083,11.198634833,12.137271474,12.235859896,12.872489063,12.270126373,12.489834748,12.30646473,12.38835189,12.277254971,12.136200224,13.14887328,-0.335031333,-0.441343205,-0.83984211,-0.367185827,-0.905282863,0.4143074161,0.1070598312,-0.993800216,-0.488501141,-1.950238447,-0.243659151,0.0913123873,0.4122861266,0.1529940944,0.3068755466,0.3529285396,0.3517680166,-0.07644617,0.0152656607,-0.045708714,4.9340978139,-2.450215726,-3.145590447,0.2447905511,-4.940696301,4.802897083,0.7035360333,0.6727262998,3.9843374322,2.3006719181,4.6904386626,-2.358903338,-2.733304321,0.3977846455,-4.633820754,5.1558256226,1.0553040499,0.5962801293,3.9996030928,2.2549632045 +050,3,6,21,147,Kentucky,McCreary County,18306,18306,18328,18290,18062,17938,17933,17902,17588,17421,17327,17260,17071,22,-38,-228,-124,-5,-31,-314,-167,-94,-67,-189,68,240,245,233,220,205,232,197,209,200,196,66,177,203,212,177,237,191,240,243,225,201,2,63,42,21,43,-32,41,-43,-34,-25,-5,0,-5,-1,-2,4,5,19,20,4,13,10,21,-96,-278,-143,-50,-3,-375,-144,-64,-57,-194,21,-101,-279,-145,-46,2,-356,-124,-60,-44,-184,-1,0,9,0,-2,-1,1,0,0,2,0,2111,2126,2108,2070,2049,2106,2178,2019,1984,1933,1998,1903,13.10830739,13.47931338,12.944444444,12.26617602,11.44132831,13.074105382,11.254248907,12.029469322,11.565038887,11.418251726,9.6673767,11.168573944,11.777777778,9.8686961612,13.227291754,10.763595379,13.71076009,13.986416484,13.010668748,11.709533658,3.4409306898,2.3107394366,1.1666666667,2.3974798584,-1.785963444,2.3105100028,-2.456511183,-1.956947162,-1.445629861,-0.291281932,-0.273089737,-0.055017606,-0.111111111,0.2230213822,0.2790567881,1.0707241476,1.1425633409,0.2302290779,0.7517275277,0.5825638636,-5.243322956,-15.29489437,-7.944444444,-2.787767277,-0.167434073,-21.13271344,-8.226456054,-3.683665247,-3.296036083,-11.30173895,-5.516412693,-15.34991197,-8.055555556,-2.564745895,0.1116227152,-20.06198929,-7.083892713,-3.453436169,-2.544308555,-10.71917509 +050,3,6,21,149,Kentucky,McLean County,9531,9527,9503,9497,9478,9442,9397,9385,9333,9202,9237,9162,9075,-24,-6,-19,-36,-45,-12,-52,-131,35,-75,-87,21,128,117,117,123,85,100,105,114,96,96,38,115,117,134,108,126,125,127,122,115,116,-17,13,0,-17,15,-41,-25,-22,-8,-19,-20,1,6,4,1,1,1,1,1,1,0,0,-8,-26,-23,-20,-61,30,-28,-109,43,-55,-67,-7,-20,-19,-19,-60,31,-27,-108,44,-55,-67,0,1,0,0,0,-2,0,-1,-1,-1,0,82,82,82,82,82,82,82,82,82,82,82,82,13.473684211,12.33201581,12.367864693,13.058017942,9.0512192525,10.684902233,11.329916374,12.365095721,10.435349747,10.528047376,12.105263158,12.33201581,14.164904863,11.465576729,13.41710148,13.356127791,13.703803615,13.232821737,12.500679385,12.72139058,1.3684210526,0,-1.797040169,1.5924412124,-4.365882228,-2.671225558,-2.37388724,-0.867726016,-2.065329637,-2.193343203,0.6315789474,0.4216073781,0.1057082452,0.1061627475,0.1064849324,0.1068490223,0.1079039655,0.1084657519,0,0,-2.736842105,-2.424242424,-2.114164905,-6.475927597,3.1945479715,-2.991772625,-11.76153224,4.6640273334,-5.978585793,-7.347699731,-2.105263158,-2.002635046,-2.00845666,-6.36976485,3.3010329038,-2.884923603,-11.65362827,4.7724930853,-5.978585793,-7.347699731 +050,3,6,21,151,Kentucky,Madison County,82916,82910,83471,84787,85418,85969,87125,88274,89653,91259,92172,93099,94265,561,1316,631,551,1156,1149,1379,1606,913,927,1166,241,951,1005,1037,977,994,1050,991,979,1030,1004,166,666,677,678,701,764,790,726,876,805,843,75,285,328,359,276,230,260,265,103,225,161,19,58,54,91,100,153,163,95,19,35,26,415,966,254,114,767,762,952,1235,787,664,979,434,1024,308,205,867,915,1115,1330,806,699,1005,52,7,-5,-13,13,4,4,11,4,3,0,5695,6048,6414,6427,6145,6246,6333,6352,6694,6681,6473,6480,11.304068752,11.809288799,12.101267891,11.288663963,11.334158119,11.802593198,10.955602724,10.674313502,11.118847526,10.717106808,7.9164140784,7.955112952,7.9119186403,8.0996452794,8.7115662005,8.8800463111,8.0260015919,9.5512754115,8.6899730665,8.9985269315,3.3876546732,3.8541758468,4.1893492505,3.1890186835,2.622591919,2.9225468872,2.929601132,1.1230380906,2.4288744596,1.7185798766,0.6894174423,0.6345289504,1.0619241833,1.155441552,1.7445937548,1.832212087,1.0502343681,0.2071623662,0.3778249159,0.2775346385,11.482366366,2.984636174,1.3303226032,8.8622367038,8.6887610534,10.701017833,13.653046785,8.5808832749,7.1678784051,10.450246579,12.171783808,3.6191651244,2.3922467865,10.017678256,10.433354808,12.53322992,14.703281153,8.7880456411,7.5457033211,10.727781217 +050,3,6,21,153,Kentucky,Magoffin County,13333,13333,13307,13222,13066,12945,12986,12791,12673,12525,12331,12184,12017,-26,-85,-156,-121,41,-195,-118,-148,-194,-147,-167,24,166,162,167,179,144,154,151,130,139,135,44,150,145,156,138,171,147,164,176,173,180,-20,16,17,11,41,-27,7,-13,-46,-34,-45,0,0,1,1,4,3,1,1,0,1,0,-4,-102,-179,-134,-2,-171,-126,-136,-149,-115,-121,-4,-102,-178,-133,2,-168,-125,-135,-149,-114,-121,-2,1,5,1,-2,0,0,0,1,1,-1,127,127,127,127,127,127,127,127,127,127,127,127,12.514606657,12.325015216,12.840721233,13.805869423,11.172750902,12.095507383,11.985078181,10.460251046,11.339995921,11.156563778,11.308379509,11.031649422,11.994925224,10.643631175,13.267641696,11.545711593,13.016906104,14.161570647,14.113807873,14.875418371,1.2062271476,1.2933657943,0.8457960094,3.1622382477,-2.094890794,0.5497957901,-1.031827923,-3.701319601,-2.773811952,-3.718854593,0,0.0760803408,0.0768905463,0.3085110486,0.2327656438,0.0785422557,0.0793713787,0,0.0815827045,0,-7.689698066,-13.61838101,-10.30333321,-0.154255524,-13.2676417,-9.896324222,-10.7945075,-11.98905697,-9.382011014,-9.999586794,-7.689698066,-13.54230067,-10.22644266,0.1542555243,-13.03487605,-9.817781967,-10.71513612,-11.98905697,-9.300428309,-9.999586794 +050,3,6,21,155,Kentucky,Marion County,19820,19844,19853,20012,19929,19934,19084,19219,19136,19284,19314,19237,19314,9,159,-83,5,-850,135,-83,148,30,-77,77,66,254,226,227,226,272,237,241,239,233,229,74,194,203,200,206,201,221,217,235,204,207,-8,60,23,27,20,71,16,24,4,29,22,11,36,13,22,2,3,2,-1,-2,-2,-2,8,62,-121,-40,-915,64,-102,126,29,-105,56,19,98,-108,-18,-913,67,-100,125,27,-107,54,-2,1,2,-4,43,-3,1,-1,-1,1,1,1297,1323,1312,1305,1324,504,505,502,505,506,504,504,12.743007651,11.316692121,11.38900735,11.584396945,14.202542882,12.358232303,12.545549193,12.38406135,12.087883583,11.880366268,9.7328483632,10.164993365,10.034367709,10.559229074,10.495261468,11.523921262,11.296199896,12.176796725,10.583383051,10.739021037,3.0101592876,1.1516987557,1.3546396408,1.0251678712,3.707281414,0.8343110416,1.2493492972,0.2072646251,1.5045005318,1.141345231,1.8060955726,0.6509601662,1.103780448,0.1025167871,0.1566456935,0.1042888802,-0.052056221,-0.103632313,-0.103758657,-0.103758657,3.1104979305,-6.058936932,-2.006873542,-46.90143011,3.3417747957,-5.31873289,6.5590838105,1.502668532,-5.447329512,2.9052424062,4.9165935031,-5.407976766,-0.903093094,-46.79891332,3.4984204893,-5.21444401,6.5070275898,1.3990362195,-5.551088169,2.8014837488 +050,3,6,21,157,Kentucky,Marshall County,31448,31449,31453,31264,31264,31218,30997,31068,31277,31324,31247,31113,31163,4,-189,0,-46,-221,71,209,47,-77,-134,50,86,289,294,306,335,347,317,328,318,282,278,116,407,391,417,406,426,424,475,426,454,460,-30,-118,-97,-111,-71,-79,-107,-147,-108,-172,-182,4,9,12,18,4,8,7,0,-4,-6,1,31,-79,86,53,-150,146,311,194,35,45,233,35,-70,98,71,-146,154,318,194,31,39,234,-1,-1,-1,-6,-4,-4,-2,0,0,-1,-2,464,464,464,464,464,464,464,464,464,464,464,464,9.2160020409,9.4037871034,9.7948209084,10.769107129,11.181825506,10.169219665,10.47906583,10.164453181,9.0442591405,8.9279979446,12.97893713,12.506397134,13.347844179,13.051514908,13.727543704,13.601732296,15.17547643,13.61653162,14.560615779,14.772946239,-3.762935089,-3.102610031,-3.553023271,-2.282407779,-2.545718199,-3.432512631,-4.6964106,-3.452078439,-5.516356639,-5.844948295,0.2870035238,0.383828045,0.5761659358,0.1285863538,0.257794248,0.2245569011,0,-0.127854757,-0.192431046,0.0321151005,-2.519253153,2.7507676561,1.6964885887,-4.821988266,4.7047450254,9.976742321,6.1979840578,1.1187291237,1.4432328416,7.4828184212,-2.232249629,3.1345957011,2.2726545245,-4.693401913,4.9625392733,10.201299222,6.1979840578,0.9908743667,1.250801796,7.5149335217 +050,3,6,21,159,Kentucky,Martin County,12929,12929,12894,12832,12734,12661,12505,12299,11961,11504,11349,11258,11031,-35,-62,-98,-73,-156,-206,-338,-457,-155,-91,-227,40,154,148,136,133,120,120,119,106,99,102,39,128,162,146,128,119,153,139,146,130,151,1,26,-14,-10,5,1,-33,-20,-40,-31,-49,0,3,3,2,-1,-1,-2,-2,-2,-2,-1,-38,-90,-91,-64,-162,-209,-304,-439,-114,-58,-177,-38,-87,-88,-62,-163,-210,-306,-441,-116,-60,-178,2,-1,4,-1,2,3,1,4,1,0,0,1657,1639,1641,1618,1653,1634,1625,1508,1404,1387,1424,1376,11.972323719,11.577876868,10.710769837,10.569816419,9.6758587325,9.8928276999,10.142765821,9.2766813985,8.7583491839,9.1524967473,9.9510223121,12.673081436,11.498326442,10.172454899,9.5952265764,12.613355317,11.847432346,12.777315889,11.500862565,13.5492844,2.0213014071,-1.095204569,-0.787556606,0.3973615195,0.0806321561,-2.720527617,-1.704666525,-3.50063449,-2.742513381,-4.396787653,0.2332270854,0.2346866933,0.1575113211,-0.079472304,-0.080632156,-0.164880462,-0.170466652,-0.175031725,-0.176936347,-0.08973036,-6.996812563,-7.118829696,-5.040362276,-12.87451323,-16.85212063,-25.06183017,-37.41743022,-9.976808297,-5.131154067,-15.88227377,-6.763585478,-6.884143002,-4.882850955,-12.95398554,-16.93275278,-25.22671063,-37.58789687,-10.15184002,-5.308090414,-15.97200413 +050,3,6,21,161,Kentucky,Mason County,17490,17488,17503,17545,17463,17326,17139,17052,17202,17221,17105,17049,17035,15,42,-82,-137,-187,-87,150,19,-116,-56,-14,49,220,196,240,207,178,233,200,209,207,210,32,207,171,228,221,242,208,233,231,227,221,17,13,25,12,-14,-64,25,-33,-22,-20,-11,1,-6,-1,3,5,17,27,47,24,-2,-1,0,34,-106,-153,-182,-39,99,7,-118,-34,-3,1,28,-107,-150,-177,-22,126,54,-94,-36,-4,-3,1,0,1,4,-1,-1,-2,0,0,1,298,298,298,298,298,298,298,298,298,298,298,298,12.554211367,11.197440585,13.797464716,12.012186276,10.412096751,13.604250598,11.620137699,12.177358271,12.12156702,12.322497359,11.812371605,9.7691956124,13.10759148,12.824604671,14.155771987,12.144567058,13.537460419,13.459185457,13.292732916,12.967961507,0.7418397626,1.4282449726,0.6898732358,-0.812418395,-3.743675236,1.4596835406,-1.91732272,-1.281827186,-1.171165896,-0.645464147,-0.342387583,-0.057129799,0.1724683089,0.290149427,0.9944137346,1.5764582239,2.7307323592,1.3983569306,-0.11711659,-0.058678559,1.9401963022,-6.055758684,-8.795883756,-10.56143914,-2.281302097,5.7803468208,0.4067048195,-6.875254909,-1.990982023,-0.176035677,1.5978087195,-6.112888483,-8.623415447,-10.27128971,-1.286888362,7.3568050447,3.1374371786,-5.476897978,-2.108098612,-0.234714235 +050,3,6,21,163,Kentucky,Meade County,28602,28600,28701,29638,29257,29245,29100,27743,27967,28054,28648,28610,28616,101,937,-381,-12,-145,-1357,224,87,594,-38,6,77,269,265,272,253,289,248,266,268,266,260,67,233,202,227,212,248,249,261,271,277,259,10,36,63,45,41,41,-1,5,-3,-11,1,36,60,125,81,38,44,15,0,-24,-7,-2,53,834,-582,-136,-228,-1467,209,84,620,-21,6,89,894,-457,-55,-190,-1423,224,84,596,-28,4,2,7,13,-2,4,25,1,-2,1,1,1,212,212,212,212,212,212,212,212,212,212,212,212,9.2219612952,8.9990661346,9.2988273905,8.672551204,10.168358461,8.9032489679,9.4964388354,9.4529293499,9.2912780747,9.0867787369,7.9877954713,6.8596655064,7.7604184472,7.267118005,8.7257885756,8.9391491653,9.317934346,9.5587457233,9.6755038597,9.0518295879,1.2341658239,2.1394006282,1.5384089433,1.4054331991,1.4425698855,-0.035900197,0.1785044894,-0.105816373,-0.384225785,0.034949149,2.0569430398,4.2448425163,2.7691360979,1.3025966235,1.5481237795,0.5385029618,0,-0.846530987,-0.244507318,-0.069898298,28.591508253,-19.76398676,-4.649413695,-7.815579741,-51.61585419,7.5031412673,2.9988754217,21.868717153,-0.733521953,0.2096948939,30.648451293,-15.51914424,-1.880277597,-6.512983118,-50.06773042,8.041644229,2.9988754217,21.022186166,-0.978029271,0.139796596 +050,3,6,21,165,Kentucky,Menifee County,6306,6306,6368,6417,6337,6341,6303,6371,6450,6465,6415,6483,6502,62,49,-80,4,-38,68,79,15,-50,68,19,19,75,75,69,60,79,77,77,61,58,60,10,68,69,64,72,89,87,88,105,63,92,9,7,6,5,-12,-10,-10,-11,-44,-5,-32,0,-1,0,-1,-1,0,0,0,0,0,0,48,44,-86,1,-24,76,88,27,-6,74,50,48,43,-86,0,-25,76,88,27,-6,74,50,5,-1,0,-1,-1,2,1,-1,0,-1,1,230,265,268,263,270,272,271,273,272,270,271,271,11.732499022,11.761016152,10.884997634,9.4906675103,12.466466782,12.011543561,11.924119241,9.4720496894,8.9936424252,9.241432422,10.63746578,10.82013486,10.096229689,11.388801012,14.044500552,13.571484284,13.627564847,16.304347826,9.7689564274,14.17019638,1.0950332421,0.9408812921,0.7887679445,-1.898133502,-1.57803377,-1.559940722,-1.703445606,-6.832298137,-0.775314002,-4.928763958,-0.15643332,0,-0.157753589,-0.158177792,0,0,0,0,0,0,6.8830660931,-13.48596519,0.1577535889,-3.796267004,11.993056651,13.727478356,4.181184669,-0.931677019,11.474647232,7.701193685,6.7266327728,-13.48596519,0,-3.954444796,11.993056651,13.727478356,4.181184669,-0.931677019,11.474647232,7.701193685 +050,3,6,21,167,Kentucky,Mercer County,21331,21324,21318,21287,21333,21300,21365,21383,21408,21557,21674,21921,21889,-6,-31,46,-33,65,18,25,149,117,247,-32,64,247,287,210,243,245,249,252,263,238,241,84,229,241,260,231,293,264,265,296,291,300,-20,18,46,-50,12,-48,-15,-13,-33,-53,-59,2,32,38,43,8,13,12,24,12,0,1,15,-81,-38,-24,48,57,29,138,139,301,24,17,-49,0,19,56,70,41,162,151,301,25,-3,0,0,-2,-3,-4,-1,0,-1,-1,2,128,128,128,128,128,128,128,128,128,128,128,128,11.59488323,13.467855467,9.8515234677,11.391069964,11.462524563,11.637961254,11.730478296,12.167194837,10.918683335,11.002054325,10.749911982,11.309244486,12.197124293,10.82854799,13.708243661,12.339043257,12.335622018,13.693877079,13.350154834,13.69550331,0.8449712475,2.1586109808,-2.345600826,0.5625219735,-2.245719098,-0.701082003,-0.605143722,-1.526682242,-2.431471499,-2.693448984,1.5021711067,1.7832003754,2.0172167101,0.375014649,0.608215589,0.5608656026,1.1171884092,0.5551571789,0,0.0456516777,-3.802370614,-1.783200375,-1.125888396,2.2500878941,2.6667914288,1.3554252062,6.4238333527,6.4305706553,13.808923042,1.0956402648,-2.300199507,0,0.8913283137,2.6251025431,3.2750070179,1.9162908088,7.5410217619,6.9857278342,13.808923042,1.1412919425 +050,3,6,21,169,Kentucky,Metcalfe County,10099,10105,10135,10059,9973,9952,9988,9917,10010,10085,10074,10084,10058,30,-76,-86,-21,36,-71,93,75,-11,10,-26,32,138,135,131,129,139,128,112,130,118,114,18,136,114,134,114,135,135,130,123,137,164,14,2,21,-3,15,4,-7,-18,7,-19,-50,0,2,3,1,0,1,-1,-1,-1,-1,0,16,-82,-110,-18,22,-76,102,95,-17,30,25,16,-80,-107,-17,22,-75,101,94,-18,29,25,0,2,0,-1,-1,0,-1,-1,0,0,-1,121,121,121,121,121,121,121,121,121,121,121,121,13.667425968,13.478434505,13.149309912,12.938816449,13.966340116,12.846891153,11.147051505,12.897465152,11.707510666,11.319630623,13.469347331,11.381789137,13.450439147,11.434302909,13.564431047,13.549455513,12.938541926,12.202986259,13.592618315,16.284380896,0.1980786372,2.0966453674,-0.301129235,1.5045135406,0.4019090681,-0.70256436,-1.791490421,0.6944788928,-1.88510765,-4.964750273,0.1980786372,0.2995207668,0.1003764115,0,0.100477267,-0.100366337,-0.099527246,-0.09921127,-0.099216192,0,-8.121224126,-10.98242812,-1.806775408,2.2066198596,-7.636272293,10.237366387,9.4550883304,-1.686591597,2.9764857625,2.4823751365,-7.923145489,-10.68290735,-1.706398996,2.2066198596,-7.535795026,10.13700005,9.3555610848,-1.785802867,2.8772695704,2.4823751365 +050,3,6,21,171,Kentucky,Monroe County,10963,10963,10970,10917,10845,10712,10672,10616,10536,10594,10746,10654,10549,7,-53,-72,-133,-40,-56,-80,58,152,-92,-105,19,113,127,129,124,139,137,135,168,111,129,27,161,163,152,147,151,172,160,152,132,155,-8,-48,-36,-23,-23,-12,-35,-25,16,-21,-26,1,11,9,16,3,3,0,1,0,-1,0,15,-15,-46,-127,-19,-46,-46,81,137,-68,-77,16,-4,-37,-111,-16,-43,-46,82,137,-69,-77,-1,-1,1,1,-1,-1,1,1,-1,-2,-2,143,143,143,143,143,143,143,143,143,143,143,143,10.325764152,11.671721349,11.968270167,11.597456042,13.059000376,12.953857791,12.7780407,15.745079663,10.373831776,12.168089421,14.711929456,14.980240787,14.102147794,13.748597082,14.186396092,16.263237519,15.144344534,14.245548266,12.336448598,14.62057256,-4.386165304,-3.308519438,-2.133877627,-2.15114104,-1.127395716,-3.309379728,-2.366303833,1.4995313964,-1.962616822,-2.452483139,1.0051628821,0.8271298594,1.4844366099,0.2805836139,0.281848929,0,0.0946521533,0,-0.093457944,0,-1.370676657,-4.227552615,-11.78271559,-1.777029555,-4.321683578,-4.349470499,7.6668244203,12.839737582,-6.355140187,-7.263123143,-0.365513775,-3.400422755,-10.29827898,-1.496445941,-4.039834649,-4.349470499,7.7614765736,12.839737582,-6.448598131,-7.263123143 +050,3,6,21,173,Kentucky,Montgomery County,26499,26511,26554,26762,26870,27243,27381,27594,27692,27954,28179,28197,28186,43,208,108,373,138,213,98,262,225,18,-11,119,388,380,412,378,374,368,356,373,336,345,71,245,270,236,242,312,316,318,311,314,319,48,143,110,176,136,62,52,38,62,22,26,3,-2,-5,-5,-2,-1,-2,12,0,-12,-8,-5,67,8,199,9,155,49,212,163,8,-30,-2,65,3,194,7,154,47,224,163,-4,-38,-3,0,-5,3,-5,-3,-1,0,0,0,1,357,357,357,357,357,357,357,357,357,357,357,357,14.554730287,14.170644391,15.227394526,13.840070299,13.606184629,13.3125927,12.795169464,13.289865142,11.919965943,12.237731231,9.1904869082,10.068615752,8.7224881267,8.8605741066,11.350613915,11.43146547,11.429392948,11.080825896,11.139491982,11.315467428,5.3642433791,4.1020286396,6.5049063996,4.9794961921,2.255570714,1.8811272293,1.3657765158,2.2090392461,0.7804739606,0.9222638029,-0.075024383,-0.186455847,-0.184798477,-0.073227885,-0.036380173,-0.072351047,0.4312978471,0,-0.425713069,-0.283773478,2.513316828,0.2983293556,7.354979395,0.3295254833,5.6389267849,1.7726006584,7.6195952989,5.8076354373,0.2838087129,-1.064150542,2.438292445,0.1118735084,7.1701809177,0.2562975981,5.6025466121,1.7002496111,8.050893146,5.8076354373,-0.141904356,-1.34792402 +050,3,6,21,175,Kentucky,Morgan County,13923,13923,13732,13723,13538,13372,13356,13279,13286,13263,13363,13297,13142,-191,-9,-185,-166,-16,-77,7,-23,100,-66,-155,24,139,142,111,144,141,135,122,114,120,115,51,140,149,129,133,172,141,145,135,156,164,-27,-1,-7,-18,11,-31,-6,-23,-21,-36,-49,1,3,14,3,3,10,23,15,1,8,6,-186,-10,-198,-153,-28,-55,-10,-15,119,-39,-112,-185,-7,-184,-150,-25,-45,13,0,120,-31,-106,21,-1,6,2,-2,-1,0,0,1,1,0,1975,1803,1809,1793,1784,1787,1783,1805,1773,1939,1949,1811,10.125660171,10.417812993,8.2497212932,10.775217001,10.587572743,10.163749294,9.1905533165,8.5630586645,9.0022505626,8.6992700178,10.198506647,10.931367155,9.5875139353,9.9521101467,12.915336963,10.615471485,10.923198614,10.140464208,11.702925731,12.405915504,-0.072846476,-0.513554162,-1.337792642,0.8231068542,-2.32776422,-0.451722191,-1.732645297,-1.577405543,-2.700675169,-3.706645486,0.2185394282,1.0271083232,0.2229654404,0.2244836875,0.7508916839,1.7316017316,1.1299860635,0.0751145497,0.6001500375,0.4538749574,-0.728464761,-14.52624629,-11.37123746,-2.095181084,-4.129904261,-0.752870318,-1.129986064,8.9386314129,-2.925731433,-8.472332539,-0.509925332,-13.49913796,-11.14827202,-1.870697396,-3.379012577,0.9787314135,0,9.0137459626,-2.325581395,-8.018457582 +050,3,6,21,177,Kentucky,Muhlenberg County,31499,31501,31659,31528,31387,31332,31312,31258,31151,30944,30841,30681,30457,158,-131,-141,-55,-20,-54,-107,-207,-103,-160,-224,87,330,337,344,355,363,347,355,335,378,358,68,376,355,386,369,417,370,402,370,408,438,19,-46,-18,-42,-14,-54,-23,-47,-35,-30,-80,0,0,1,-1,0,0,4,1,-3,-2,-3,124,-84,-120,-9,2,4,-86,-161,-64,-129,-143,124,-84,-119,-10,2,4,-82,-160,-67,-131,-146,15,-1,-4,-3,-8,-4,-2,0,-1,1,2,1951,2088,2089,2090,2100,2098,2101,2099,2102,2094,2083,2065,10.44518651,10.712866566,10.969562652,11.333886725,11.603004635,11.120190998,11.434092922,10.844056001,12.288287117,11.711210704,11.901182205,11.285067154,12.30886972,11.780856906,13.32907144,11.857264177,12.947902408,11.977017075,13.263547999,14.328241028,-1.455995695,-0.572200588,-1.339307068,-0.446970181,-1.726066805,-0.737073179,-1.513809485,-1.132961075,-0.975260882,-2.617030325,0,0.0317889216,-0.031888264,0,0,0.1281866397,0.0322087125,-0.097110949,-0.065017392,-0.098138637,-2.658774748,-3.814670587,-0.286994372,0.063852883,0.1278568004,-2.756012755,-5.185602706,-2.071700251,-4.193621794,-4.677941706,-2.658774748,-3.782881666,-0.318882635,0.063852883,0.1278568004,-2.627826115,-5.153393993,-2.1688112,-4.258639186,-4.776080343 +050,3,6,21,179,Kentucky,Nelson County,43437,43441,43626,44060,44401,44541,44861,45119,45517,45606,45781,46221,46450,185,434,341,140,320,258,398,89,175,440,229,155,581,608,594,586,562,576,559,542,568,551,58,345,355,400,358,375,438,452,461,432,453,97,236,253,194,228,187,138,107,81,136,98,-2,-4,0,1,-3,1,1,2,-3,0,0,86,201,95,-49,100,76,260,-18,98,304,128,84,197,95,-48,97,77,261,-16,95,304,128,4,1,-7,-6,-5,-6,-1,-2,-1,0,3,496,496,496,496,496,496,496,496,496,496,496,496,13.251830395,13.746170629,13.357019181,13.109326413,12.491664814,12.710181385,12.269130735,11.861643341,12.347557662,11.891530252,7.8689870675,8.0261358113,8.9946257111,8.0087693788,8.3351855968,9.6650337614,9.9206566948,10.088962325,9.3911001935,9.7765212418,5.3828433273,5.7200348176,4.3623934699,5.1005570345,4.1564792176,3.0451476235,2.3484740406,1.7726810159,2.9564574683,2.1150090104,-0.091234633,0,0.0224865643,-0.067112593,0.0222271616,0.0220662871,0.043896711,-0.065654852,0,0,4.5845402915,2.1478391608,-1.10184165,2.2370864186,1.689264281,5.7372346529,-0.395070399,2.1447251797,6.608551988,2.7624607482,4.4933056588,2.1478391608,-1.079355085,2.1699738261,1.7114914425,5.75930094,-0.351173688,2.0790703273,6.608551988,2.7624607482 +050,3,6,21,181,Kentucky,Nicholas County,7135,7142,7140,7101,7022,7021,7063,7072,7091,7172,7198,7248,7234,-2,-39,-79,-1,42,9,19,81,26,50,-14,15,90,87,90,96,89,90,95,87,78,81,16,100,88,114,95,100,101,100,95,97,109,-1,-10,-1,-24,1,-11,-11,-5,-8,-19,-28,1,0,0,1,2,-1,0,0,-1,0,0,-2,-29,-79,23,40,20,32,85,35,70,13,-1,-29,-79,24,42,19,32,85,34,70,13,0,0,1,-1,-1,1,-2,1,0,-1,1,95,95,95,95,95,95,95,95,95,95,95,95,12.639561829,12.320328542,12.81777398,13.63249077,12.592854616,12.709171786,13.321180677,12.108559499,10.798837048,11.186300235,14.043957587,12.461941514,16.235847041,13.490485657,14.14927485,14.262515004,14.02229545,13.221990257,13.429322996,15.053169452,-1.404395759,-0.141612972,-3.418073061,0.1420051122,-1.556420233,-1.553343218,-0.701114772,-1.113430759,-2.630485948,-3.866869217,0,0,0.1424197109,0.2840102244,-0.141492748,0,0,-0.139178845,0,0,-4.0727477,-11.18742477,3.2756533504,5.6802044874,2.8298549699,4.5188166349,11.918951132,4.8712595685,9.6912640177,1.7953321364,-4.0727477,-11.18742477,3.4180730613,5.9642147117,2.6883622214,4.5188166349,11.918951132,4.7320807237,9.6912640177,1.7953321364 +050,3,6,21,183,Kentucky,Ohio County,23842,23849,23829,23986,24029,23987,23964,24040,24202,24137,24125,24043,23899,-20,157,43,-42,-23,76,162,-65,-12,-82,-144,83,301,296,305,265,275,322,290,293,275,269,74,244,270,291,277,283,298,313,273,291,284,9,57,26,14,-12,-8,24,-23,20,-16,-15,1,-2,14,19,10,-5,0,0,-1,-1,0,-28,105,9,-72,-18,91,139,-40,-30,-66,-128,-27,103,23,-53,-8,86,139,-40,-31,-67,-128,-2,-3,-6,-3,-3,-2,-1,-2,-1,1,-1,307,307,307,307,307,307,307,307,307,307,307,307,12.590191363,12.329480371,12.704098634,11.052949886,11.457378552,13.349363625,11.998593268,12.142057934,11.418369042,11.221893121,10.206002301,11.246485473,12.12095968,11.553460825,11.79068411,12.354380001,12.950205838,11.313248519,12.082710513,11.847649243,2.384189062,1.0829948974,0.5831389537,-0.500510938,-0.333305558,0.9949836242,-0.95161257,0.8288094153,-0.664341472,-0.625756122,-0.083655757,0.5831510986,0.7914028657,0.4170924485,-0.208315974,0,0,-0.041440471,-0.041521342,0,4.3919272195,0.3748828491,-2.999000333,-0.750766407,3.7913507208,5.7626134903,-1.654978382,-1.243214123,-2.74040857,-5.339785574,4.3082714629,0.9580339477,-2.207597468,-0.333673959,3.5830347471,5.7626134903,-1.654978382,-1.284654594,-2.781929912,-5.339785574 +050,3,6,21,185,Kentucky,Oldham County,60316,60356,60441,60782,62119,63078,63991,64586,65487,66606,66632,66818,66999,85,341,1337,959,913,595,901,1119,26,186,181,128,531,492,518,498,550,579,585,602,573,571,121,309,335,377,387,411,401,425,444,431,454,7,222,157,141,111,139,178,160,158,142,117,20,72,63,29,2,38,35,46,12,-11,-1,62,46,1091,790,807,425,694,920,-147,59,71,82,118,1154,819,809,463,729,966,-135,48,70,-4,1,26,-1,-7,-7,-6,-7,3,-4,-6,4568,4568,4463,5183,5175,5178,5175,5108,5154,4581,4459,4347,8.7607137259,8.0064442112,8.2749586651,7.8382611022,8.5551848309,8.9026931031,8.8573959256,9.0364610697,8.5874859498,8.5340427599,5.0980424507,5.4515422983,6.0225085266,6.0911788084,6.3930563009,6.1657684531,6.4348602878,6.6647653072,6.4593480704,6.7853860122,3.6626712753,2.5549019129,2.2524501386,1.7470822939,2.16212853,2.73692465,2.4225356378,2.3716957625,2.1281378794,1.7486567476,1.1878933866,1.0252154173,0.4632698867,0.0314789602,0.5910854974,0.5381593413,0.6964789959,0.1801287921,-0.164855751,-0.014945784,0.7589318859,17.754127306,12.620110706,12.701760461,6.610824642,10.670930939,13.929579917,-2.206577703,0.884226302,1.0611506759,1.9468252724,18.779342723,13.083380592,12.733239421,7.2019101394,11.20909028,14.626058913,-2.026448911,0.7193705508,1.0462048918 +050,3,6,21,187,Kentucky,Owen County,10841,10835,10848,10823,10762,10646,10659,10737,10674,10794,10867,10884,11017,13,-25,-61,-116,13,78,-63,120,73,17,133,33,99,127,101,116,86,96,101,103,111,104,13,96,116,109,117,115,127,110,129,114,121,20,3,11,-8,-1,-29,-31,-9,-26,-3,-17,1,1,-1,0,0,0,0,0,1,0,0,-8,-29,-70,-107,13,107,-32,130,98,20,151,-7,-28,-71,-107,13,107,-32,130,99,20,151,0,0,-1,-1,1,0,0,-1,0,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,9.1366342116,11.767431086,9.4357249626,10.889462567,8.038885773,8.9673532296,9.4093534563,9.5101795854,10.206427291,9.4972832291,8.8597665082,10.748204772,10.183109118,10.983337245,10.749672836,11.863061043,10.247810695,11.910807442,10.482276677,11.049723757,0.2768677034,1.0192263146,-0.747384155,-0.093874677,-2.710787063,-2.895707814,-0.838457239,-2.400627857,-0.275849386,-1.552440528,0.0922892345,-0.092656938,0,0,0,0,0,0.0923318406,0,0,-2.676387799,-6.485985638,-9.996263079,1.220370805,10.001869508,-2.989117743,12.111049003,9.0485203823,1.8389959082,13.789324688,-2.584098565,-6.578642576,-9.996263079,1.220370805,10.001869508,-2.989117743,12.111049003,9.1408522229,1.8389959082,13.789324688 +050,3,6,21,189,Kentucky,Owsley County,4755,4757,4751,4810,4685,4603,4506,4449,4480,4404,4454,4413,4331,-6,59,-125,-82,-97,-57,31,-76,50,-41,-82,10,53,48,35,62,53,59,57,61,55,51,32,69,87,86,82,72,79,70,74,59,78,-22,-16,-39,-51,-20,-19,-20,-13,-13,-4,-27,0,-1,-1,-1,0,0,0,0,0,0,0,14,77,-88,-29,-80,-37,50,-63,63,-38,-54,14,76,-89,-30,-80,-37,50,-63,63,-38,-54,2,-1,3,-1,3,-1,1,0,0,1,-1,90,90,90,90,90,90,90,90,90,90,90,90,11.086706411,10.110584518,7.5366063738,13.612910308,11.836962591,13.215365662,12.832057632,13.772860691,12.405548664,11.665141812,14.433636649,18.325434439,18.518518519,18.004171698,16.08040201,17.695150633,15.758667267,16.70806051,13.307770385,17.840805124,-3.346930237,-8.214849921,-10.98191214,-4.39126139,-4.243439419,-4.47978497,-2.926609635,-2.935199819,-0.902221721,-6.175663312,-0.20918314,-0.210637177,-0.215331611,0,0,0,0,0,0,0,16.107101768,-18.53607162,-6.24461671,-17.56504556,-8.263539922,11.199462426,-14.18280054,14.224429894,-8.571106349,-12.35132662,15.897918628,-18.74670879,-6.45994832,-17.56504556,-8.263539922,11.199462426,-14.18280054,14.224429894,-8.571106349,-12.35132662 +050,3,6,21,191,Kentucky,Pendleton County,14877,14874,14915,14662,14555,14569,14484,14494,14604,14609,14572,14566,14586,41,-253,-107,14,-85,10,110,5,-37,-6,20,32,163,150,175,167,176,183,177,178,192,180,17,155,160,134,136,173,150,148,164,188,177,15,8,-10,41,31,3,33,29,14,4,3,0,0,0,4,3,10,8,5,1,5,3,27,-261,-100,-29,-118,-2,70,-29,-52,-16,13,27,-261,-100,-25,-115,8,78,-24,-51,-11,16,-1,0,3,-2,-1,-1,-1,0,0,1,1,215,215,215,215,215,215,215,215,215,215,215,215,11.022077966,10.267994661,12.017580003,11.496231026,12.147146111,12.578184068,12.117892719,12.199718995,13.178667033,12.349066959,10.481117084,10.952527638,9.2020326878,9.362200117,11.940092484,10.309986941,10.132475268,11.240190535,12.90411147,12.143249177,0.5409608818,-0.684532977,2.8155473149,2.134030909,0.2070536269,2.268197127,1.9854174511,0.9595284603,0.2745555632,0.2058177827,0,0,0.2746875429,0.2065191202,0.6901787563,0.5498659702,0.3423133536,0.0685377472,0.343194454,0.2058177827,-17.64884877,-6.845329774,-1.991484686,-8.123085396,-0.138035751,4.811327239,-1.985417451,-3.563962853,-1.098222253,0.8918770582,-17.64884877,-6.845329774,-1.716797143,-7.916566275,0.552143005,5.3611932092,-1.643104097,-3.495425105,-0.755027799,1.0976948408 +050,3,6,21,193,Kentucky,Perry County,28712,28697,28668,28699,28296,27989,27561,27381,27222,26605,26246,25801,25456,-29,31,-403,-307,-428,-180,-159,-617,-359,-445,-345,92,405,409,402,367,417,408,375,344,311,313,128,425,430,399,398,410,413,459,421,453,470,-36,-20,-21,3,-31,7,-5,-84,-77,-142,-157,0,-2,-2,0,1,30,51,36,7,20,15,8,53,-392,-315,-402,-216,-205,-573,-291,-323,-202,8,51,-394,-315,-401,-186,-154,-537,-284,-303,-187,-1,0,12,5,4,-1,0,4,2,0,-1,611,611,611,611,611,611,611,611,611,611,611,611,14.119615807,14.352136152,14.284445234,13.213321332,15.179643988,14.944233833,13.933527783,13.017729087,11.950736834,12.212966034,14.816880785,15.089042898,14.177844897,14.329432943,14.924829821,15.127373954,17.054638007,15.931581238,17.407343363,18.338958581,-0.697264978,-0.736906746,0.1066003376,-1.116111611,0.2548141677,-0.183140121,-3.121110223,-2.91385215,-5.456606529,-6.125992547,-0.069726498,-0.070181595,0,0.0360036004,1.0920607186,1.8680292292,1.3376186672,0.26489565,0.7685361308,0.5852859122,1.847752192,-13.7555926,-11.19303544,-14.47344734,-7.862837174,-7.508744941,-21.29043045,-11.01209059,-12.41185851,-7.881850284,1.7780256942,-13.82577419,-11.19303544,-14.43744374,-6.770776455,-5.640715712,-19.95281179,-10.74719494,-11.64332238,-7.296564372 +050,3,6,21,195,Kentucky,Pike County,65024,65029,65076,64923,64605,63880,62970,61831,60475,58958,58567,57919,57057,47,-153,-318,-725,-910,-1139,-1356,-1517,-391,-648,-862,165,733,749,733,750,710,637,618,625,578,573,222,823,804,809,847,827,807,772,801,828,869,-57,-90,-55,-76,-97,-117,-170,-154,-176,-250,-296,2,-2,5,14,7,24,27,12,-1,5,8,95,-58,-263,-673,-834,-1057,-1220,-1385,-213,-405,-571,97,-60,-258,-659,-827,-1033,-1193,-1373,-214,-400,-563,7,-3,-5,10,14,11,7,10,-1,2,-3,1100,1233,1356,1566,1590,1611,1634,1559,1443,1443,1443,1443,11.277009823,11.565067013,11.409892205,11.824990146,11.378113957,10.416496329,10.348898546,10.636034886,9.9239393575,9.967297523,12.661635859,12.414304243,12.592909678,13.354355538,13.253098934,13.196409007,12.927750287,13.63114231,14.216300671,15.116198163,-1.384626036,-0.849237231,-1.183017473,-1.529365392,-1.874984976,-2.779912678,-2.578851741,-2.995107424,-4.292361314,-5.14890064,-0.030769467,0.0772033846,0.2179242713,0.1103665747,0.3846123028,0.441515543,0.2009494863,-0.017017656,0.0858472263,0.1391594768,-0.892314556,-4.06089803,-10.47593104,-13.14938904,-16.93896684,-19.94996157,-23.19291988,-3.624760689,-6.953625328,-9.932507654,-0.923084024,-3.983694645,-10.25800677,-13.03902247,-16.55435453,-19.50844603,-22.99197039,-3.641778345,-6.867778102,-9.793348177 +050,3,6,21,197,Kentucky,Powell County,12613,12613,12641,12617,12470,12470,12347,12224,12256,12284,12356,12303,12218,28,-24,-147,0,-123,-123,32,28,72,-53,-85,37,139,167,165,169,170,166,155,158,155,162,26,153,162,179,173,190,153,163,186,189,170,11,-14,5,-14,-4,-20,13,-8,-28,-34,-8,0,0,-1,-3,-3,5,5,-1,-2,-2,-1,16,-9,-153,17,-115,-109,15,38,102,-17,-76,16,-9,-154,14,-118,-104,20,37,100,-19,-77,1,-1,2,0,-1,1,-1,-1,0,0,0,188,188,188,188,188,188,188,188,188,188,188,188,11.006413809,13.313668434,13.231756215,13.619696176,13.837450653,13.562091503,12.632436838,12.824675325,12.571474918,13.213164227,12.114973474,12.915055606,14.354450682,13.942055849,15.465386024,12.5,13.284433578,15.097402597,15.329088771,13.865666164,-1.108559664,0.3986128274,-1.122694467,-0.322359673,-1.627935371,1.0620915033,-0.65199674,-2.272727273,-2.757613853,-0.652501937,0,-0.079722565,-0.240577386,-0.241769755,0.4069838427,0.408496732,-0.081499593,-0.162337662,-0.16221258,-0.081562742,-0.712645498,-12.19755252,1.3632718524,-9.267840593,-8.872247772,1.2254901961,3.0969845151,8.2792207792,-1.378806926,-6.198768403,-0.712645498,-12.27727508,1.1226944667,-9.509610348,-8.465263929,1.6339869281,3.0154849226,8.1168831169,-1.541019506,-6.280331145 +050,3,6,21,199,Kentucky,Pulaski County,63063,63062,63195,63519,63528,63815,63894,63898,64061,64377,64735,65243,65530,133,324,9,287,79,4,163,316,358,508,287,209,716,770,762,714,734,747,751,812,720,748,169,705,781,808,797,817,800,908,859,786,851,40,11,-11,-46,-83,-83,-53,-157,-47,-66,-103,9,16,22,71,41,49,40,35,8,17,13,86,298,13,270,134,47,180,440,398,558,376,95,314,35,341,175,96,220,475,406,575,389,-2,-1,-15,-8,-13,-9,-4,-2,-1,-1,1,962,962,962,962,962,962,962,962,962,962,962,962,11.301040138,12.121498343,11.967677846,11.18167083,11.487417053,11.675614845,11.694358367,12.578226656,11.07879795,11.439670268,11.127420806,12.294662605,12.690136089,12.481500912,12.786402905,12.504005189,14.139117707,13.306276721,12.094354429,13.014918982,0.1736193317,-0.173164262,-0.722458243,-1.299830082,-1.298985852,-0.828390344,-2.444759339,-0.728050065,-1.015556479,-1.575248713,0.2525372098,0.3463285241,1.115098592,0.6420847395,0.7668711656,0.6252002595,0.5450100438,0.1239234153,0.2615827294,0.1988177988,4.7035055321,0.2046486733,4.2405157724,2.098520856,0.7355703017,2.8134011676,6.8515548358,6.1651899126,8.5860684116,5.7504224878,4.9560427419,0.5509771974,5.3556143644,2.7406055955,1.5024414674,3.438601427,7.3965648796,6.289113328,8.847651141,5.9492402866 +050,3,6,21,201,Kentucky,Robertson County,2282,2285,2278,2294,2218,2218,2189,2139,2137,2127,2147,2149,2136,-7,16,-76,0,-29,-50,-2,-10,20,2,-13,4,31,21,21,25,20,31,20,25,19,20,9,20,34,47,30,39,33,36,35,17,22,-5,11,-13,-26,-5,-19,-2,-16,-10,2,-2,0,0,0,0,0,0,0,0,0,0,0,-2,5,-65,26,-24,-33,2,5,31,-1,-10,-2,5,-65,26,-24,-33,2,5,31,-1,-10,0,0,2,0,0,2,-2,1,-1,1,-1,57,57,57,57,57,57,57,57,57,57,57,57,13.560804899,9.3085106383,9.4679891794,11.345586567,9.2421441774,14.499532273,9.3808630394,11.698642957,8.8454376164,9.3348891482,8.7489063867,15.070921986,21.190261497,13.61470388,18.022181146,15.434985968,16.885553471,16.37810014,7.9143389199,10.268378063,4.8118985127,-5.762411348,-11.72227232,-2.269117313,-8.780036969,-0.935453695,-7.504690432,-4.679457183,0.9310986965,-0.933488915,0,0,0,0,0,0,0,0,0,0,2.1872265967,-28.81205674,11.722272317,-10.8917631,-15.24953789,0.935453695,2.3452157598,14.506317267,-0.465549348,-4.667444574,2.1872265967,-28.81205674,11.722272317,-10.8917631,-15.24953789,0.935453695,2.3452157598,14.506317267,-0.465549348,-4.667444574 +050,3,6,21,203,Kentucky,Rockcastle County,17056,17060,17086,17113,17063,16748,16832,16938,16879,16780,16830,16736,16750,26,27,-50,-315,84,106,-59,-99,50,-94,14,42,165,207,173,177,169,187,171,194,153,160,21,200,217,191,214,190,203,166,217,216,260,21,-35,-10,-18,-37,-21,-16,5,-23,-63,-100,0,2,2,3,0,0,0,-1,-1,-1,-1,6,61,-39,-305,122,128,-41,-104,76,-31,115,6,63,-37,-302,122,128,-41,-105,75,-32,114,-1,-1,-3,5,-1,-1,-2,1,-2,1,0,341,341,341,341,341,341,341,341,341,341,341,341,9.6494049534,12.113764045,10.233356008,10.541989279,10.008883625,11.059526274,10.160729671,11.544183279,9.1163677531,9.5562324554,11.696248428,12.698970037,11.298098252,12.745681954,11.252591057,12.005795901,9.8636323123,12.912823564,12.87016624,15.52887774,-2.046843475,-0.585205993,-1.064742244,-2.203692674,-1.243707433,-0.946269628,0.2970973588,-1.368640286,-3.753798487,-5.972645285,0.1169624843,0.1170411985,0.1774570406,0,0,0,-0.059419472,-0.059506099,-0.059584103,-0.059726453,3.5673557706,-2.282303371,-18.0414658,7.2662298987,7.5806929227,-2.424815921,-6.179625063,4.5224635525,-1.847107192,6.8685420773,3.6843182549,-2.165262172,-17.86400875,7.2662298987,7.5806929227,-2.424815921,-6.239044535,4.4629574531,-1.906691295,6.8088156244 +050,3,6,21,205,Kentucky,Rowan County,23333,23332,23376,23564,23808,24225,24267,24658,24436,24546,24488,24519,24682,44,188,244,417,42,391,-222,110,-58,31,163,72,262,269,302,273,272,272,279,271,256,254,72,221,226,223,211,223,259,241,232,218,224,0,41,43,79,62,49,13,38,39,38,30,-2,-10,8,12,25,24,21,16,-3,7,5,42,158,180,315,-40,315,-255,57,-95,-14,126,40,148,188,327,-15,339,-234,73,-98,-7,131,4,-1,13,11,-5,3,-1,-1,1,0,2,2435,2477,2519,2860,3128,3033,3265,3175,3181,3002,3105,2991,11.163187047,11.356919699,12.574688235,11.259589211,11.119059785,11.080783803,11.391939896,11.053554676,10.447487094,10.324993394,9.4162760971,9.5415013088,9.2852830346,8.7024663862,9.1159938682,10.551187518,9.8403495161,9.4628217155,8.8966882282,9.1055059857,1.7469109501,1.8154183906,3.2894052006,2.5571228244,2.0030659172,0.5295962847,1.5515903801,1.5907329608,1.5507988655,1.2194874088,-0.426075841,0.3377522587,0.4996564862,1.0310979131,0.9810935105,0.8555016906,0.6533012127,-0.122364074,0.2856734752,0.2032479015,6.7319982957,7.5994258212,13.115982762,-1.649756661,12.876852325,-10.38823481,2.3273855702,-3.87486234,-0.57134695,5.1218471169,6.3059224542,7.9371780799,13.615639248,-0.618658748,13.857945835,-9.532733124,2.9806867829,-3.997226414,-0.285673475,5.3250950184 +050,3,6,21,207,Kentucky,Russell County,17565,17575,17582,17712,17648,17759,17795,17694,17769,17721,17799,17944,17998,7,130,-64,111,36,-101,75,-48,78,145,54,59,222,229,224,190,224,208,215,212,208,210,37,237,224,213,230,234,266,268,252,241,247,22,-15,5,11,-40,-10,-58,-53,-40,-33,-37,7,31,45,13,2,7,5,5,0,-8,-5,-21,115,-115,90,76,-96,129,1,119,186,96,-14,146,-70,103,78,-89,134,6,119,178,91,-1,-1,1,-3,-2,-2,-1,-1,-1,0,0,177,177,177,177,177,177,177,177,177,177,177,177,12.580041933,12.952488688,12.652865253,10.687967599,12.623629857,11.730536052,12.116089039,11.936936937,11.638642531,11.685493295,13.430044767,12.669683258,12.031519191,12.93806604,13.187184761,15.001550912,15.102845872,14.189189189,13.485157933,13.744365923,-0.850002833,0.2828054299,0.6213460615,-2.250098442,-0.563554904,-3.271014861,-2.986756833,-2.252252252,-1.846515402,-2.058872628,1.7566725222,2.5452488688,0.7343180727,0.1125049221,0.394488433,0.2819840397,0.2817695125,0,-0.447640097,-0.278226031,6.516688389,-6.504524887,5.0837405033,4.2751870394,-5.410127082,7.2751882243,0.0563539025,6.7004504505,10.407632264,5.3419397919,8.2733609112,-3.959276018,5.818058576,4.3876919615,-5.015638649,7.557172264,0.338123415,6.7004504505,9.9599921663,5.0637137611 +050,3,6,21,209,Kentucky,Scott County,47173,47089,47271,47914,48976,50007,51236,52177,53454,54820,55983,57079,58470,182,643,1062,1031,1229,941,1277,1366,1163,1096,1391,155,589,645,649,667,692,710,675,703,695,713,43,297,287,339,321,392,369,411,470,416,448,112,292,358,310,346,300,341,264,233,279,265,7,59,83,67,29,59,40,44,13,2,8,63,292,603,642,833,577,894,1052,912,816,1121,70,351,686,709,862,636,934,1096,925,818,1129,0,0,18,12,21,5,2,6,5,-1,-3,1316,1213,1212,1214,1214,1214,1101,1085,1118,1092,1092,1092,12.375899564,13.314067499,13.113362901,13.17621959,13.383230348,13.443023355,12.46836729,12.689187116,12.294139499,12.341084735,6.2404790671,5.924243988,6.8496610529,6.3411791432,7.5812518736,6.9865853774,7.5918503057,8.4835248143,7.3587942899,7.7542860605,6.1354204969,7.3898235112,6.2637018478,6.8350404472,5.8019784747,6.4564379775,4.8765169847,4.2056623016,4.9353452088,4.5867986742,1.2396911278,1.7132831046,1.3537678187,0.5728791126,1.1410557667,0.7573534284,0.8127528308,0.2346506864,0.0353788187,0.1384693939,6.1354204969,12.447104964,12.971924472,16.455458649,11.1591386,16.926849126,19.432181318,16.46164815,14.43455803,19.403023825,7.3751116247,14.160388069,14.325692291,17.028337762,12.300194366,17.684202554,20.244934149,16.696298837,14.469936849,19.541493219 +050,3,6,21,211,Kentucky,Shelby County,42074,42004,42222,42891,43704,44507,45135,45838,46579,47216,48073,49022,49611,218,669,813,803,628,703,741,637,857,949,589,149,586,605,621,616,612,598,550,564,553,570,54,325,352,324,357,364,369,391,381,391,389,95,261,253,297,259,248,229,159,183,162,181,18,117,136,150,88,122,75,74,16,32,33,103,292,417,353,281,331,437,402,657,755,374,121,409,553,503,369,453,512,476,673,787,407,2,-1,7,3,0,2,0,2,1,0,1,1696,1674,1723,1809,1818,1806,1804,1824,1795,1817,1812,1759,13.769929388,13.973093135,14.079876659,13.743557707,13.454541457,12.941341961,11.727704035,11.837672764,11.390905814,11.55799783,7.6369062305,8.129799642,7.3460226049,7.9650163986,8.0023743308,7.9855437852,8.3373314143,7.9967257501,8.0539677635,7.8878265895,6.1330231574,5.8432934927,6.7338540545,5.7785413088,5.4521671265,4.9557981757,3.3903726211,3.8409470138,3.3369380504,3.6701712409,2.749286243,3.1410589526,3.4009363912,1.9633653868,2.6821144735,1.6230780051,1.5779092702,0.3358205039,0.6591482569,0.6691472428,6.861466521,9.6310410532,8.0035369738,6.2693826555,7.2768843503,9.4571345099,8.571885495,13.789629443,15.551779185,7.5836687518,9.610752764,12.772100006,11.404473365,8.2327480422,9.9589988238,11.080212515,10.149794765,14.125449947,16.210927442,8.2528159946 +050,3,6,21,213,Kentucky,Simpson County,17327,17330,17337,17308,17552,17692,17764,17913,17995,18048,18386,18530,18635,7,-29,244,140,72,149,82,53,338,144,105,65,243,231,204,205,239,228,224,202,230,218,73,182,207,158,184,202,185,227,204,225,205,-8,61,24,46,21,37,43,-3,-2,5,13,-3,-4,0,7,13,27,17,10,-2,3,4,19,-87,217,87,41,85,24,47,341,137,86,16,-91,217,94,54,112,41,57,339,140,90,-1,1,3,0,-3,0,-2,-1,1,-1,2,327,327,327,327,327,327,327,327,327,327,327,327,14.027998268,13.253012048,11.576438543,11.563628159,13.397987499,12.699119973,12.42959798,11.088543668,12.460721638,11.731467779,10.506566604,11.876075731,8.9660651458,10.379061372,11.32382207,10.304110505,12.59606581,11.198331229,12.189836385,11.031884838,3.521431664,1.3769363167,2.6103733969,1.184566787,2.0741654287,2.3950094686,-0.16646783,-0.109787561,0.270885253,0.6995829409,-0.230913552,0,0.3972307343,0.7333032491,1.5135801777,0.9468642085,0.554892767,-0.109787561,0.1625311518,0.2152562895,-5.02236975,12.449799197,4.937010555,2.3127256318,4.7649746335,1.3367494709,2.6079960048,18.718779162,7.4222559324,4.6280102247,-5.253283302,12.449799197,5.3342412893,3.0460288809,6.2785548112,2.2836136794,3.1628887717,18.608991601,7.5847870842,4.8432665142 +050,3,6,21,215,Kentucky,Spencer County,17061,17108,17167,17434,17486,17645,17782,18043,18298,18583,18959,19302,19585,59,267,52,159,137,261,255,285,376,343,283,39,212,191,155,205,204,174,197,195,198,189,12,131,127,132,116,143,155,160,140,145,174,27,81,64,23,89,61,19,37,55,53,15,-1,-1,2,-2,-2,8,12,13,6,-2,-2,31,187,-12,136,52,191,224,235,316,292,271,30,186,-10,134,50,199,236,248,322,290,269,2,0,-2,2,-2,1,0,0,-1,0,-1,113,113,113,113,113,113,113,113,113,113,113,113,12.253981099,10.939289805,8.8241154536,11.573093968,11.388695045,9.5759610357,10.683007511,10.388365031,10.349964716,9.7204721372,7.5720354903,7.273768614,7.5147305798,6.5486775623,7.9832519191,8.530310118,8.6765543234,7.4583133557,7.5795196153,8.9490060946,4.6819456085,3.6655211913,1.3093848738,5.0244164056,3.4054431263,1.0456509177,2.0064531873,2.9300516755,2.7704451008,0.7714660426,-0.057801798,0.1145475372,-0.113859554,-0.112908234,0.446615492,0.6604111059,0.7049700388,0.319642001,-0.104545098,-0.102862139,10.808936158,-0.687285223,7.7424496883,2.9356140797,10.662944871,12.327673977,12.743689162,16.834478717,15.263584329,13.937819837,10.75113436,-0.572737686,7.6285901341,2.8227058458,11.109560363,12.988085083,13.448659201,17.154120718,15.159039231,13.834957698 +050,3,6,21,217,Kentucky,Taylor County,24512,24474,24635,24952,25035,25125,25330,25562,25420,25517,25483,25735,25707,161,317,83,90,205,232,-142,97,-34,252,-28,74,304,309,340,362,306,360,340,328,310,307,90,280,260,307,276,277,310,314,310,306,352,-16,24,49,33,86,29,50,26,18,4,-45,11,40,30,63,37,59,36,38,13,24,20,149,253,9,-2,83,146,-227,33,-64,225,-4,160,293,39,61,120,205,-191,71,-51,249,16,17,0,-5,-4,-1,-2,-1,0,-1,-1,1,1035,1163,1293,1349,1374,1469,1434,1374,1420,1338,1338,1337,12.261278158,12.363214436,13.55661882,14.349420275,12.025465692,14.122631517,13.349824293,12.862745098,12.105119294,11.935772326,11.293282514,10.402704703,12.240829346,10.940441978,10.885797375,12.161154917,12.328955376,12.156862745,11.948924206,13.685315501,0.967995644,1.9605097325,1.3157894737,3.4089782975,1.1396683172,1.9614765996,1.0208689165,0.7058823529,0.1561950877,-1.749543175,1.6133260734,1.2003120811,2.5119617225,1.4666534536,2.3186355419,1.4122631517,1.4920391857,0.5098039216,0.937170526,0.7775747444,10.204287414,0.3600936243,-0.079744817,3.2900604499,5.7376404936,-8.905103762,1.2957182402,-2.509803922,8.7859736811,-0.155514949,11.817613487,1.5604057055,2.4322169059,4.7567139035,8.0562760355,-7.49284061,2.7877574258,-2,9.7231442071,0.6220597955 +050,3,6,21,219,Kentucky,Todd County,12460,12456,12426,12423,12617,12476,12432,12449,12364,12203,12339,12318,12448,-30,-3,194,-141,-44,17,-85,-161,136,-21,130,48,158,196,193,155,186,199,158,183,169,170,50,135,123,120,127,111,157,151,148,122,131,-2,23,73,73,28,75,42,7,35,47,39,6,26,17,8,-3,6,7,35,18,-7,-4,-35,-51,103,-224,-69,-65,-135,-203,87,-63,97,-29,-25,120,-216,-72,-59,-128,-168,105,-70,93,1,-1,1,2,0,1,1,0,-4,2,-2,195,195,195,195,195,195,195,195,195,195,195,195,12.71680953,15.654952077,15.382776073,12.445800546,14.951167558,16.039979043,12.862783409,14.913210007,13.708074786,13.728498748,10.865628396,9.8242811502,9.5644203563,10.197526899,8.9224709618,12.654656833,12.292913258,12.060956727,9.8957699639,10.579019624,1.851181134,5.8306709265,5.8183557167,2.248273647,6.0286965958,3.3853222101,0.569870151,2.8522532801,3.8123048222,3.1494791246,2.0926395428,1.357827476,0.6376280238,-0.240886462,0.4822957277,0.5642203684,2.8493507551,1.4668731155,-0.56779008,-0.3230235,-4.104792949,8.2268370607,-17.85358467,-5.54038863,-5.224870383,-10.88139282,-16.52623438,7.0898867248,-5.110110719,7.833319874,-2.012153407,9.5846645367,-17.21595664,-5.781275092,-4.742574655,-10.31717245,-13.67688362,8.5567598403,-5.677900799,7.5102963741 +050,3,6,21,221,Kentucky,Trigg County,14339,14327,14321,14216,14412,14306,14133,14222,14309,14426,14666,14666,14776,-6,-105,196,-106,-173,89,87,117,240,0,110,27,141,153,151,146,146,160,152,162,161,165,61,169,142,189,189,162,163,173,172,164,188,-34,-28,11,-38,-43,-16,-3,-21,-10,-3,-23,0,0,-1,4,3,1,5,2,0,1,1,30,-78,183,-70,-133,103,87,136,250,3,134,30,-78,182,-66,-130,104,92,138,250,4,135,-2,1,3,-2,0,1,-2,0,0,-1,-2,78,78,78,78,78,78,78,78,78,78,78,78,9.8819076988,10.688836105,10.51605265,10.267590281,10.298007406,11.215870457,10.579432748,11.137082359,10.977771717,11.208477685,11.844272348,9.9203576918,13.162476496,13.291606597,11.426556163,11.426168028,12.041064903,11.824556579,11.182326469,12.770871544,-1.962364649,0.7684784127,-2.646423846,-3.024016316,-1.128548757,-0.210297571,-1.461632156,-0.68747422,-0.204554752,-1.562393859,0,-0.069861674,0.2785709311,0.2109778825,0.0705342973,0.3504959518,0.1392030625,0,0.0681849175,0.0679301678,-5.466587238,12.784686321,-4.874991295,-9.35335279,7.2650326221,6.0986295608,9.4658082478,17.186855493,0.2045547525,9.1026424835,-5.466587238,12.714824647,-4.596420364,-9.142374908,7.3355669194,6.4491255126,9.6050113102,17.186855493,0.27273967,9.1705726513 +050,3,6,21,223,Kentucky,Trimble County,8809,8806,8809,8812,8843,8808,8726,8739,8593,8535,8500,8529,8481,3,3,31,-35,-82,13,-146,-58,-35,29,-48,27,95,106,97,90,99,87,94,82,100,92,8,73,76,89,89,100,123,100,101,95,109,19,22,30,8,1,-1,-36,-6,-19,5,-17,-1,9,0,-2,0,0,1,5,2,-2,-2,-14,-29,1,-40,-85,15,-112,-55,-18,26,-31,-15,-20,1,-42,-85,15,-111,-50,-16,24,-33,-1,1,0,-1,2,-1,1,-2,0,0,2,41,41,41,41,41,41,41,41,41,41,41,41,10.782588956,12.007929765,10.990878704,10.265769362,11.336959634,10.039233787,10.976179355,9.6272380393,11.744670856,10.817166373,8.2855683559,8.6094590767,10.084414481,10.151705258,11.451474377,14.193399492,11.676786548,11.857939536,11.157437313,12.815990594,2.4970206004,3.3984706882,0.906464223,0.114064104,-0.114514744,-4.154165705,-0.700607193,-2.230701497,0.5872335428,-1.998824221,1.0215084274,0,-0.226616056,0,0,0.1153934918,0.5838393274,0.2348106839,-0.234893417,-0.235155791,-3.291527155,0.1132823563,-4.532321115,-9.695448842,1.7177211566,-12.92407108,-6.422232602,-2.113296155,3.0536144225,-3.644914756,-2.270018728,0.1132823563,-4.758937171,-9.695448842,1.7177211566,-12.80867759,-5.838393274,-1.878485471,2.8187210053,-3.880070547 +050,3,6,21,225,Kentucky,Union County,15007,15006,15274,15264,15092,15078,15093,14976,14795,14656,14519,14497,14443,268,-10,-172,-14,15,-117,-181,-139,-137,-22,-54,39,163,159,178,179,173,158,168,142,160,151,53,159,139,159,166,187,175,194,195,143,172,-14,4,20,19,13,-14,-17,-26,-53,17,-21,0,0,10,5,2,-2,6,5,-2,3,2,250,-14,-207,-38,3,-101,-171,-118,-82,-43,-36,250,-14,-197,-33,5,-103,-165,-113,-84,-40,-34,32,0,5,0,-3,0,1,0,0,1,1,1371,1644,1641,1641,1657,1657,1663,1657,1659,1659,1662,1660,10.675224311,10.475688497,11.799801127,11.86569885,11.506867538,10.614356253,11.408780687,9.734361611,11.028398125,10.435383552,10.413255616,9.1579918303,10.540271793,11.003944185,12.438059131,11.756407242,13.174425317,13.367609254,9.8566308244,11.886662059,0.2619686947,1.3176966662,1.2595293338,0.8617546651,-0.931191593,-1.142050989,-1.76564463,-3.633247644,1.1717673008,-1.451278507,0,0.6588483331,0.3314550878,0.1325776408,-0.13302737,0.4030768197,0.3395470442,-0.137103685,0.2067824648,0.1382170007,-0.916890432,-13.6381605,-2.519058668,0.1988664612,-6.717882204,-11.48768936,-8.013310244,-5.621251071,-2.963881996,-2.487906012,-0.916890432,-12.97931216,-2.18760358,0.331444102,-6.850909575,-11.08461254,-7.6737632,-5.758354756,-2.757099531,-2.349689012 +050,3,6,21,227,Kentucky,Warren County,113792,113782,114348,115889,117436,119640,121480,124224,126752,129232,130926,132759,134510,566,1541,1547,2204,1840,2744,2528,2480,1694,1833,1751,370,1445,1477,1567,1516,1658,1714,1653,1714,1751,1728,161,908,913,964,920,960,1013,1056,1043,1049,1086,209,537,564,603,596,698,701,597,671,702,642,101,457,568,801,544,674,780,593,124,309,254,238,545,426,792,702,1357,1046,1287,900,821,850,339,1002,994,1593,1246,2031,1826,1880,1024,1130,1104,18,2,-11,8,-2,15,1,3,-1,1,5,6210,6365,6524,6345,6648,6640,6889,6655,7011,6888,6882,6496,12.552283082,12.660452159,13.219389563,12.574651626,13.495913782,13.658676527,12.914869679,13.176608061,13.280998161,12.930792572,7.8875245942,7.8259937855,8.1324132346,7.6310550763,7.8142805978,8.0724850185,8.2505156572,8.018204322,7.9564632042,8.126643943,4.664758488,4.8344583735,5.0869763283,4.9435965494,5.6816331846,5.5861915084,4.6643540221,5.1584037393,5.3245349565,4.8041486293,3.9698224004,4.8687453123,6.7573267644,4.5122760451,5.4862761697,6.2157337753,4.6331020689,0.9532668609,2.3437055578,1.9007067786,4.7342520968,3.6515589842,6.6814017446,5.8228268082,11.04581122,8.3354583705,10.055315957,6.9188723776,6.2271270645,6.3606329204,8.7040744971,8.5203042966,13.438728509,10.335102853,16.53208739,14.551192146,14.688418026,7.8721392385,8.5708326223,8.261339699 +050,3,6,21,229,Kentucky,Washington County,11717,11701,11683,11679,11813,11843,11895,12000,12095,11871,12011,12098,12147,-18,-4,134,30,52,105,95,-224,140,87,49,21,117,139,165,149,130,141,135,150,156,158,54,134,143,130,120,138,139,155,130,144,146,-33,-17,-4,35,29,-8,2,-20,20,12,12,0,-1,17,36,17,23,13,15,3,0,0,15,13,117,-41,8,90,81,-222,117,74,37,15,12,134,-5,25,113,94,-207,120,74,37,0,1,4,0,-2,0,-1,3,0,1,0,389,363,342,446,422,425,425,426,205,205,205,205,10.016265731,11.833815767,13.949949273,12.553711349,10.880937435,11.703672961,11.26596011,12.561761996,12.941225269,13.033615178,11.47162058,12.174357228,10.990869124,10.110371556,11.550533584,11.537663416,12.934991238,10.886860397,11.945746402,12.043720355,-1.45535485,-0.340541461,2.9590801488,2.4433397927,-0.66959615,0.1660095455,-1.669031127,1.6749015995,0.9954788668,0.9898948237,-0.085609109,1.4473012089,3.0436252959,1.4323026371,1.9250889307,1.0790620461,1.2517733456,0.2512352399,0,0,1.1129184145,9.960837732,-3.466351031,0.6740247704,7.5329566855,6.7233865947,-18.52624551,9.7981743573,6.1387863453,3.0521757063,1.0273093057,11.408138941,-0.422725736,2.1063274075,9.4580456162,7.8024486408,-17.27447217,10.049409597,6.1387863453,3.0521757063 +050,3,6,21,231,Kentucky,Wayne County,20813,20798,20833,20890,20816,20778,20615,20606,20726,20621,20401,20278,20209,35,57,-74,-38,-163,-9,120,-105,-220,-123,-69,54,215,237,247,210,250,256,250,212,221,213,21,204,233,220,249,267,234,241,250,234,253,33,11,4,27,-39,-17,22,9,-38,-13,-40,1,8,3,7,12,1,-3,-3,-3,-3,-2,3,39,-82,-69,-134,9,102,-110,-179,-107,-29,4,47,-79,-62,-122,10,99,-113,-182,-110,-31,-2,-1,1,-3,-2,-2,-1,-1,0,0,2,331,331,331,331,331,331,331,331,331,331,331,331,10.306066198,11.365271184,11.876712987,10.146643152,12.129739696,12.387496371,12.092775776,10.335917313,10.865557167,10.521895917,9.7787790907,11.173452261,10.578448815,12.031019738,12.954561995,11.322945901,11.657435848,12.188581737,11.504707589,12.497838812,0.5272871078,0.1918189229,1.2982641727,-1.884376585,-0.824822299,1.0645504694,0.4353399279,-1.852664424,-0.639150422,-1.975942895,0.383481533,0.1438641922,0.3365870077,0.5798081801,0.0485189588,-0.145165973,-0.145113309,-0.146262981,-0.147496251,-0.098797145,1.8694724732,-3.93228792,-3.317786219,-6.474524678,0.436670629,4.9356430853,-5.320821341,-8.727024523,-5.260699624,-1.432558599,2.2529540062,-3.788423728,-2.981199211,-5.894716498,0.4851895878,4.7904771122,-5.465934651,-8.873287504,-5.408195875,-1.531355744 +050,3,6,21,233,Kentucky,Webster County,13621,13620,13579,13530,13461,13359,13184,13153,13180,13012,13047,12945,12923,-41,-49,-69,-102,-175,-31,27,-168,35,-102,-22,42,167,133,154,150,169,162,166,190,184,175,56,184,167,166,170,166,173,179,168,149,148,-14,-17,-34,-12,-20,3,-11,-13,22,35,27,4,9,10,12,10,12,9,4,0,2,2,-30,-42,-42,-104,-168,-45,31,-159,11,-138,-50,-26,-33,-32,-92,-158,-33,40,-155,11,-136,-48,-1,1,-3,2,3,-1,-2,0,2,-1,-1,393,393,393,393,393,393,393,393,393,393,393,393,12.320631525,9.8551368975,11.483967189,11.302414949,12.833656073,12.303953215,12.675626145,14.582294025,14.158202524,13.5302304,13.574827548,12.374495202,12.378821775,12.809403609,12.605839693,13.139406828,13.668295663,12.893817875,11.465066174,11.442709139,-1.254196023,-2.519358305,-0.894854586,-1.50698866,0.22781638,-0.835453613,-0.992669517,1.6884761503,2.6931363496,2.0875212618,0.6639861301,0.7409877367,0.8948545861,0.75349433,0.91126552,0.6835529564,0.3054367746,0,0.1538935057,0.1546312046,-3.09860194,-3.112148494,-7.755406413,-12.65870474,-3.4172457,2.354460183,-12.14111179,0.8442380751,-10.61865189,-3.865780114,-2.43461581,-2.371160757,-6.860551827,-11.90521041,-2.50598018,3.0380131394,-11.83567502,0.8442380751,-10.46475839,-3.71114891 +050,3,6,21,235,Kentucky,Whitley County,35637,35634,35718,35863,35784,35892,35864,36143,36116,36135,36196,36362,36451,84,145,-79,108,-28,279,-27,19,61,166,89,130,531,528,519,601,600,557,588,542,508,511,77,467,433,483,468,527,476,540,496,503,482,53,64,95,36,133,73,81,48,46,5,29,10,20,8,11,10,15,36,33,4,19,14,19,61,-184,68,-171,196,-143,-61,13,141,45,29,81,-176,79,-161,211,-107,-28,17,160,59,2,0,2,-7,0,-5,-1,-1,-2,1,1,1590,1659,1736,1708,1755,1734,1759,1728,1707,1739,1762,1895,14.836339252,14.738928357,14.481834924,16.751212442,16.665046454,15.416764694,16.276591327,14.986658556,14.002591031,14.035955118,13.048155237,12.087037838,13.477314582,13.044205363,14.637465802,13.174829433,14.947889995,13.714728125,13.864770253,13.239394064,1.7881840153,2.6518905188,1.0045203415,3.7070070795,2.0275806519,2.2419352607,1.3287013329,1.2719304309,0.1378207779,0.7965610537,0.5588075048,0.2233170963,0.306936771,0.2787223368,0.4166261613,0.9964156714,0.9134821663,0.1106026462,0.5237189559,0.3845467156,1.7043628896,-5.136293215,1.8974273118,-4.766151959,5.4439151749,-3.957984473,-1.688557944,0.3594586,3.8865459357,1.2360430143,2.2631703944,-4.912976119,2.2043640828,-4.487429623,5.8605413363,-2.961568801,-0.775075777,0.4700612462,4.4102648915,1.6205897299 +050,3,6,21,237,Kentucky,Wolfe County,7355,7358,7364,7365,7197,7282,7255,7247,7203,7264,7215,7151,7106,6,1,-168,85,-27,-8,-44,61,-49,-64,-45,26,106,84,88,83,86,100,99,85,87,80,14,93,104,110,97,103,127,102,99,111,128,12,13,-20,-22,-14,-17,-27,-3,-14,-24,-48,0,0,0,0,0,-1,0,0,-1,0,0,-4,-13,-154,106,-12,12,-17,64,-34,-41,3,-4,-13,-154,106,-12,11,-17,64,-35,-41,3,-2,1,6,1,-1,-2,0,0,0,1,0,132,132,132,132,132,132,132,132,132,132,132,132,14.393373617,11.536876803,12.155535603,11.419137374,11.860433044,13.84083045,13.686320592,11.741142344,12.111930948,11.22255734,12.62814855,14.283752232,15.194419504,13.345256931,14.20493725,17.577854671,14.101057579,13.674977554,15.453153279,17.956091744,1.7652250662,-2.746875429,-3.038883901,-1.926119557,-2.344504206,-3.737024221,-0.414736988,-1.93383521,-3.341222331,-6.733534404,0,0,0,0,-0.137912012,0,0,-0.138131086,0,0,-1.765225066,-21.1509408,14.641895159,-1.65095962,1.6549441456,-2.352941176,8.8477224027,-4.696456938,-5.707921481,0.4208459003,-1.765225066,-21.1509408,14.641895159,-1.65095962,1.5170321335,-2.352941176,8.8477224027,-4.834588024,-5.707921481,0.4208459003 +050,3,6,21,239,Kentucky,Woodford County,24939,24945,25040,24943,25114,25344,25584,25860,26147,26375,26487,26654,26765,95,-97,171,230,240,276,287,228,112,167,111,82,292,257,273,275,275,338,272,292,251,266,35,220,211,225,223,252,237,252,249,248,266,47,72,46,48,52,23,101,20,43,3,0,0,14,45,21,-4,13,13,16,-4,-13,-6,50,-184,86,162,195,239,175,193,73,178,119,50,-170,131,183,191,252,188,209,69,165,113,-2,1,-6,-1,-3,1,-2,-1,0,-1,-2,329,333,338,325,320,307,341,327,429,412,495,519,11.683972551,10.268294145,10.820880732,10.799560163,10.691237073,12.998250236,10.357564449,11.047633461,9.4465666811,9.9590033509,8.8029930176,8.4303893561,8.918308296,8.7574615143,9.7970608817,9.1141577095,9.5959788279,9.4207559305,9.3336595096,9.9590033509,2.880979533,1.8379047885,1.9025724365,2.0420986491,0.8941761916,3.884092526,0.7615856213,1.6268775302,0.1129071715,0,0.5601904648,1.7979503366,0.832375441,-0.157084511,0.5054039344,0.4999327014,0.609268497,-0.151337445,-0.48926441,-0.224639173,-7.362503251,3.4360828655,6.4211819731,7.657869934,9.2916569474,6.7298632876,7.3493012452,2.7619083652,6.6991588416,4.4553436043,-6.802312786,5.2340332021,7.2535574141,7.5007854226,9.7970608817,7.229795989,7.9585697422,2.6105709205,6.2098944318,4.230704431 +040,3,7,22,000,Louisiana,Louisiana,4533372,4533500,4544635,4576244,4602067,4626040,4645938,4666998,4681346,4673673,4664450,4658285,4645318,11135,31609,25823,23973,19898,21060,14348,-7673,-9223,-6165,-12967,14557,62310,62274,62527,64216,64400,64479,61865,60751,58469,57616,9178,40770,40729,43787,43590,43973,43683,45010,46530,46136,50108,5379,21540,21545,18740,20626,20427,20796,16855,14221,12333,7508,1320,7235,4649,6562,5096,6523,6770,3724,3747,6070,4928,4082,2715,-601,-1622,-5808,-5845,-13134,-28265,-27183,-24591,-25334,5402,9950,4048,4940,-712,678,-6364,-24541,-23436,-18521,-20406,354,119,230,293,-16,-45,-84,13,-8,23,-69,127534,127540,127911,128577,128553,129048,129442,129498,128791,129207,129737,129720,13.663156808,13.56981693,13.551425011,13.85162907,13.830224969,13.794742684,13.226055447,13.01139426,12.543314811,12.385739159,8.9399278293,8.8750533731,9.4899203054,9.4025244667,9.4434236421,9.3456124422,9.6226421347,9.9656001533,9.8975247071,10.771740798,4.7232289783,4.6947635573,4.0615047051,4.4491046031,4.3868013267,4.4491302417,3.6034133121,3.0457941066,2.6457901034,1.6139983617,1.5864699005,1.0130404167,1.4221768343,1.0992260767,1.4008471657,1.448384869,0.7961501735,0.802516737,1.3021929723,1.059374524,0.5953373573,-0.130960914,-0.351534719,-1.252807114,-1.255243244,-2.809909434,-6.042745611,-5.821940876,-5.275490508,-5.446062133,2.1818072578,0.8820795024,1.0706421154,-0.153581037,0.1456039213,-1.361524565,-5.246595437,-5.019424139,-3.973297536,-4.386687609 +050,3,7,22,001,Louisiana,Acadia Parish,61773,61788,61876,61872,62007,62310,62681,62696,62830,62581,62315,62207,61918,88,-4,135,303,371,15,134,-249,-266,-108,-289,210,871,879,880,918,899,937,865,848,806,802,113,691,619,690,601,674,611,630,678,692,753,97,180,260,190,317,225,326,235,170,114,49,6,40,25,56,39,36,46,24,24,41,33,-9,-223,-140,66,30,-245,-236,-509,-461,-266,-371,-3,-183,-115,122,69,-209,-190,-485,-437,-225,-338,-6,-1,-10,-9,-15,-1,-2,1,1,3,0,1050,1050,1050,1050,1050,1050,1050,1050,1050,1050,1050,1050,14.076995184,14.191267285,14.157355792,14.689057612,14.340748303,14.929178019,13.794643213,13.579297976,12.945503606,12.9224572,11.167857258,9.9936228094,11.100653973,9.6166924019,10.751573255,9.7350349728,10.046965577,10.857033051,11.114501855,12.132930514,2.9091379255,4.1976444757,3.0567018187,5.0723652103,3.5891750481,5.1941430461,3.7476776359,2.7222649244,1.8310017507,0.7895266868,0.6464750945,0.4036196611,0.9009226413,0.6240449312,0.5742680077,0.7329158899,0.3827415458,0.384319754,0.6585181735,0.5317220544,-3.604098652,-2.260270102,1.0618016844,0.4800345625,-3.90821283,-3.760177174,-8.117310284,-7.382141942,-4.272337418,-5.977844914,-2.957623558,-1.856650441,1.9627243257,1.1040794937,-3.333944822,-3.027261285,-7.734568738,-6.997822188,-3.613819245,-5.44612286 +050,3,7,22,003,Louisiana,Allen Parish,25764,25750,25704,25740,25619,25660,25710,25630,25696,25595,25535,25594,25440,-46,36,-121,41,50,-80,66,-101,-60,59,-154,78,348,313,349,325,310,309,311,315,303,297,85,246,243,231,279,268,240,294,271,240,269,-7,102,70,118,46,42,69,17,44,63,28,3,25,-2,0,1,10,19,12,8,16,18,-43,-92,-189,-74,10,-132,-21,-129,-111,-21,-198,-40,-67,-191,-74,11,-122,-2,-117,-103,-5,-180,1,1,0,-3,-7,0,-1,-1,-1,1,-2,4200,4200,4199,4185,4179,4182,4189,4181,4179,4180,4184,4181,13.529274551,12.188710839,13.611809903,12.653299591,12.07635372,12.040681136,12.126883859,12.321533346,11.852373408,11.639299291,9.5637975274,9.462801067,9.0095360674,10.862371034,10.440202571,9.3519853486,11.463999532,10.600430276,9.3880185413,10.541991613,3.9654770236,2.7259097724,4.6022738353,1.7909285575,1.6361511492,2.6886957877,0.6628843267,1.7211030706,2.4643548671,1.0973076772,0.971930643,-0.077883136,0,0.0389332295,0.3895597974,0.7403655068,0.4679183482,0.312927831,0.6258679028,0.7054120782,-3.576704766,-7.359956385,-2.886171727,0.3893322951,-5.142189326,-0.818298718,-5.030122244,-4.341873655,-0.821451622,-7.75953286,-2.604774123,-7.437839522,-2.886171727,0.4282655246,-4.752629529,-0.077933211,-4.562203895,-4.028945824,-0.19558372,-7.054120782 +050,3,7,22,005,Louisiana,Ascension Parish,107215,107219,107894,110084,112238,114665,117318,119417,121646,123237,124961,126798,128665,675,2190,2154,2427,2653,2099,2229,1591,1724,1837,1867,369,1655,1539,1634,1716,1716,1736,1743,1710,1655,1680,110,665,621,681,741,759,712,758,759,937,1029,259,990,918,953,975,957,1024,985,951,718,651,5,124,31,139,45,77,123,57,57,118,91,385,1072,1183,1310,1603,1063,1082,553,718,1002,1125,390,1196,1214,1449,1648,1140,1205,610,775,1120,1216,26,4,22,25,30,2,0,-4,-2,-1,0,790,790,790,790,790,790,790,789,788,789,788,788,15.185018672,13.844783692,14.402630199,14.794187505,14.497222633,14.402873938,14.235369544,13.779321348,13.147494231,13.152589612,6.1015331822,5.5864916652,6.0025649727,6.3883991499,6.4122330876,5.9071694951,6.1907114826,6.1160847388,7.4436266429,8.0559611372,9.0834854894,8.2582920269,8.4000652261,8.4057883552,8.0849895453,8.4957044424,8.0446580612,7.6632366095,5.7038675877,5.0966284746,1.1377294956,0.2788747852,1.2251931442,0.3879594625,0.6505164002,1.0204801235,0.465528436,0.4593107116,0.9374044225,0.7124319373,9.8358549945,10.642221642,11.546784309,13.819978188,8.9805056287,8.9769064518,4.516442546,5.7857033497,7.9599934858,8.8075376865,10.97358449,10.921096428,12.771977453,14.207937651,9.6310220289,9.9973865753,4.9819709821,6.2450140614,8.8973979083,9.5199696238 +050,3,7,22,007,Louisiana,Assumption Parish,23421,23417,23332,23186,23071,23201,23052,22902,22773,22586,22280,21921,21621,-85,-146,-115,130,-149,-150,-129,-187,-306,-359,-300,60,252,266,276,245,267,265,259,241,243,231,86,203,212,214,222,218,231,220,233,212,240,-26,49,54,62,23,49,34,39,8,31,-9,1,11,4,22,22,11,18,7,5,18,10,-62,-207,-174,48,-195,-210,-183,-234,-318,-408,-299,-61,-196,-170,70,-173,-199,-165,-227,-313,-390,-289,2,1,1,-2,1,0,2,1,-1,0,-2,199,199,199,199,199,199,199,199,199,199,199,199,10.834515671,11.500962017,11.929460581,10.593907422,11.620315968,11.603721949,11.42000485,10.743101681,10.995226352,10.610445088,8.7278042908,9.1661802538,9.2496542185,9.5993773377,9.4877486182,10.114942529,9.7003902202,10.386484197,9.5925431551,11.023839052,2.1067113805,2.3347817628,2.6798063624,0.9945300845,2.13256735,1.4887794198,1.71961463,0.3566174832,1.4026831972,-0.413393964,0.4729352079,0.1729467972,0.9508990318,0.9512896461,0.4787396092,0.7881773399,0.3086487797,0.222885927,0.8144612113,0.4593266272,-8.89978073,-7.52318568,2.0746887967,-8.431885499,-9.139574357,-8.013136289,-10.31768778,-14.17554496,-18.46112079,-13.73386615,-8.426845522,-7.350238883,3.0255878285,-7.480595853,-8.660834748,-7.224958949,-10.009039,-13.95265903,-17.64665958,-13.27453953 +050,3,7,22,009,Louisiana,Avoyelles Parish,42073,42079,42115,41805,41584,41288,41101,40992,40970,40840,40410,40138,39966,36,-310,-221,-296,-187,-109,-22,-130,-430,-272,-172,127,568,581,530,561,560,537,542,551,500,497,81,515,515,520,537,450,455,494,536,477,490,46,53,66,10,24,110,82,48,15,23,7,2,26,22,34,22,5,15,6,3,14,12,-7,-390,-310,-341,-231,-220,-117,-182,-451,-309,-191,-5,-364,-288,-307,-209,-215,-102,-176,-448,-295,-179,-5,1,1,1,-2,-4,-2,-2,3,0,0,3343,3343,3343,3343,3343,3344,3348,3342,3347,3350,3348,3348,13.536701621,13.934691626,12.790809924,13.618322834,13.643063355,13.103633391,13.25021391,13.563076923,12.414957541,12.408868471,12.273593899,12.351749032,12.549473887,13.035720788,10.96317591,11.102706132,12.076763232,13.193846154,11.843869494,12.234095676,1.2631077216,1.5829425943,0.2413360363,0.5826020464,2.6798874447,2.000927259,1.1734506784,0.3692307692,0.5710880469,0.1747727954,0.6196377502,0.5276475314,0.8205425234,0.5340518759,0.1218130657,0.3660232791,0.1466813348,0.0738461538,0.3476188111,0.2996105063,-9.294566254,-7.435033398,-8.229558838,-5.607544697,-5.359774889,-2.854981577,-4.449333822,-11.10153846,-7.67244376,-4.768800559,-8.674928503,-6.907385866,-7.409016314,-5.073492821,-5.237961824,-2.488958298,-4.302652487,-11.02769231,-7.324824949,-4.469190053 +050,3,7,22,011,Louisiana,Beauregard Parish,35654,35653,35832,36101,36346,36281,36264,36557,37028,36885,37491,37649,37881,179,269,245,-65,-17,293,471,-143,606,158,232,137,460,509,484,491,497,532,482,554,501,513,113,313,317,344,391,360,361,433,370,411,449,24,147,192,140,100,137,171,49,184,90,64,7,20,50,36,26,55,41,31,36,33,30,139,103,10,-242,-137,105,261,-224,387,34,136,146,123,60,-206,-111,160,302,-193,423,67,166,9,-1,-7,1,-6,-4,-2,1,-1,1,2,1300,1300,1300,1299,1297,1297,1295,1293,1292,1293,1294,1294,12.789679285,14.051651552,13.328376499,13.536425667,13.64990868,14.459468642,13.042360613,14.897278692,13.335107799,13.584006355,8.7025426438,8.7512250335,9.4730609828,10.779516162,9.8872577965,9.8117822926,11.71647748,9.9494460579,10.939579452,11.889315504,4.087136641,5.3004265187,3.8553155163,2.7569095044,3.7626508837,4.6476863491,1.3258831329,4.9478326342,2.3955283471,1.6946908513,0.5560730124,1.3803194059,0.991366847,0.7167964712,1.5105532745,1.1143575457,0.8388240228,0.968054211,0.8783603939,0.7943863366,2.8637760138,0.2760638812,-6.66418825,-3.776966021,2.883783524,7.0938370592,-6.061180036,10.406582769,0.9049773756,3.601218059,3.4198490262,1.6563832871,-5.672821403,-3.06016955,4.3943367985,8.2081946049,-5.222356013,11.37463698,1.7833377695,4.3956043956 +050,3,7,22,013,Louisiana,Bienville Parish,14353,14355,14307,14262,14195,13966,13789,13828,13796,13640,13303,13234,12983,-48,-45,-67,-229,-177,39,-32,-156,-337,-69,-251,29,190,211,172,158,179,174,151,170,155,155,71,219,206,215,216,207,185,181,206,165,213,-42,-29,5,-43,-58,-28,-11,-30,-36,-10,-58,0,-2,-1,1,0,2,7,4,5,5,5,-6,-12,-71,-190,-119,66,-29,-130,-306,-65,-196,-6,-14,-72,-189,-119,68,-22,-126,-301,-60,-191,0,-2,0,3,0,-1,1,0,0,1,-2,319,319,319,319,319,319,319,319,319,319,319,319,13.301130596,14.829391714,12.215475303,11.385335975,12.963030018,12.597741095,11.007435486,12.619233196,11.681802766,11.824388755,15.331303161,14.477984327,15.269344128,15.564763106,14.990766557,13.394150014,13.194343199,15.291541402,12.435467461,16.248998741,-2.030172565,0.3514073866,-3.053868826,-4.17942713,-2.027736539,-0.79640892,-2.186907712,-2.672308206,-0.753664695,-4.424609986,-0.140011901,-0.070281477,0.0710202052,0,0.1448383242,0.5068056762,0.291587695,0.3711539175,0.3768323473,0.3814318953,-0.840071406,-4.989984889,-13.493839,-8.575031526,4.7796646993,-2.099623516,-9.476600087,-22.71461975,-4.898820515,-14.9521303,-0.980083307,-5.060266367,-13.42281879,-8.575031526,4.9245030235,-1.59281784,-9.185012392,-22.34346584,-4.521988167,-14.5706984 +050,3,7,22,015,Louisiana,Bossier Parish,116979,116989,117637,120122,123177,124049,124922,125634,125946,127011,127153,127377,127275,648,2485,3055,872,873,712,312,1065,142,224,-102,433,1754,1852,1802,1837,1837,1790,1700,1672,1676,1635,170,944,935,970,1015,1026,1078,1054,1075,1118,1207,263,810,917,832,822,811,712,646,597,558,428,63,157,323,339,241,263,161,28,-44,117,100,305,1510,1743,-286,-177,-347,-560,394,-411,-455,-633,368,1667,2066,53,64,-84,-399,422,-455,-338,-533,17,8,72,-13,-13,-15,-1,-3,0,4,3,1961,1958,2133,2663,2643,2375,2562,2549,2558,2564,2557,2560,14.754436215,15.224065861,14.577754767,14.756738737,14.663388624,14.230065983,13.44101962,13.156859351,13.169370998,12.841053673,7.9408140176,7.6860159721,7.8470711009,8.1535600532,8.1897859161,8.5698386199,8.3334321644,8.4591051447,8.7848190783,9.4796035374,6.8136221973,7.5380498892,6.730683666,6.6031786835,6.4736027076,5.6602273631,5.1075874556,4.6977542059,4.3845519192,3.3614501359,1.3206650432,2.655169154,2.7424300033,1.9359684461,2.0993310877,1.2799109627,0.2213814996,-0.346233141,0.9193415315,0.7853855458,12.701937676,14.328049026,-2.31367251,-1.421852344,-2.769839876,-4.451864218,3.115153959,-3.234132293,-3.575217067,-4.971490505,14.02260272,16.98321818,0.4287574931,0.5141161019,-0.670508788,-3.171953255,3.3365354586,-3.580365433,-2.655875535,-4.186104959 +050,3,7,22,017,Louisiana,Caddo Parish,254969,254969,255652,257058,257367,255248,252740,251499,249024,246177,243105,240431,237479,683,1406,309,-2119,-2508,-1241,-2475,-2847,-3072,-2674,-2952,981,3871,3863,3800,3767,3628,3452,3308,3202,2976,2918,597,2639,2625,2864,2782,2735,2758,2785,2798,2786,2925,384,1232,1238,936,985,893,694,523,404,190,-7,52,151,193,177,157,171,170,56,47,132,103,255,32,-1094,-3289,-3712,-2308,-3343,-3437,-3525,-2991,-3032,307,183,-901,-3112,-3555,-2137,-3173,-3381,-3478,-2859,-2929,-8,-9,-28,57,62,3,4,11,2,-5,-16,6247,6244,6245,6246,6252,6252,6256,6246,6241,6246,6246,6246,15.100154083,15.01871021,14.825941496,14.831059001,14.390001567,13.793571924,13.360231502,13.088566512,12.309321333,12.211504258,10.294318426,10.205569325,11.174078012,10.953014638,10.848030398,11.020472586,11.2479579,11.437167114,11.523443963,12.240798477,4.8058356576,4.8131408855,3.6518634843,3.8780443633,3.5419711684,2.7730993381,2.112273602,1.6513993975,0.78587737,-0.029294219,0.5890269353,0.7503523351,0.6905767486,0.6181248376,0.6782497982,0.6792894632,0.2261707872,0.1921182467,0.5459779623,0.4310435019,0.1248269002,-4.253292511,-12.83224252,-14.61451845,-9.154389089,-13.3580275,-13.88123207,-14.40886851,-12.37136428,-12.68858153,0.7138538355,-3.502940176,-12.14166577,-13.99639362,-8.476139291,-12.67873804,-13.65506128,-14.21675026,-11.82538632,-12.25753803 +050,3,7,22,019,Louisiana,Calcasieu Parish,192768,192767,193023,193881,194516,195550,196641,198542,200780,202653,203507,204038,203310,256,858,635,1034,1091,1901,2238,1873,854,531,-728,597,2610,2727,2741,2771,2764,3014,3011,3022,3008,2969,498,1857,1810,1928,1991,2023,2033,2044,2115,2027,2214,99,753,917,813,780,741,981,967,907,981,755,37,200,114,195,113,168,255,133,141,194,173,137,-85,-374,59,241,1001,1004,779,-189,-650,-1655,174,115,-260,254,354,1169,1259,912,-48,-456,-1482,-17,-10,-22,-33,-43,-9,-2,-6,-5,6,-1,3796,3796,3796,3798,3798,3796,3797,3791,3790,3791,3791,3792,13.491718876,14.042332974,14.054031882,14.130869908,13.988455981,15.09558702,14.926889967,14.880835139,14.761560073,14.577216532,9.5992804417,9.3203603529,9.8855065553,10.153216163,10.238294663,10.182258929,10.133033242,10.41461493,9.9473677753,10.870312362,3.8924384343,4.7219726208,4.1685253265,3.9776537452,3.7501613177,4.9133280911,4.7938567247,4.4662202088,4.8141922978,3.7069041704,1.0338481897,0.5870282211,0.9998307979,0.5762498375,0.8502390032,1.2771647943,0.6593412041,0.694307662,0.9520421058,0.8493965847,-0.439385481,-1.925864515,0.3025129081,1.2289930162,5.066007394,5.0285233471,3.8618556241,-0.930667717,-3.189831798,-8.125730334,0.5944627091,-1.338836294,1.3023437059,1.8052428536,5.9162463972,6.3056881414,4.5211968282,-0.236360055,-2.237789692,-7.276333749 +050,3,7,22,021,Louisiana,Caldwell Parish,10132,10126,10148,10123,10040,9986,9953,10048,10069,9962,9979,9946,9839,22,-25,-83,-54,-33,95,21,-107,17,-33,-107,38,140,103,103,135,144,115,140,124,122,122,15,115,151,124,124,124,116,119,153,118,137,23,25,-48,-21,11,20,-1,21,-29,4,-15,0,4,1,17,12,0,12,0,-1,5,5,1,-55,-34,-50,-54,75,11,-129,46,-41,-96,1,-51,-33,-33,-42,75,23,-129,45,-36,-91,-2,1,-2,0,-2,0,-1,1,1,-1,-1,584,584,584,584,584,584,584,584,584,584,584,584,13.812836071,10.216733621,10.286627384,13.541300968,14.399280036,11.43311627,13.978333583,12.43668823,12.245922208,12.332575183,11.346258201,14.977929872,12.383900929,12.437935704,12.399380031,11.532534672,11.881583546,15.345268542,11.844416562,13.848875411,2.4665778699,-4.761196251,-2.097273544,1.1033652641,1.999900005,-0.099418402,2.0967500374,-2.908580312,0.4015056462,-1.516300227,0.3946524592,0.0991915886,1.6977928693,1.2036711972,0,1.1930208282,0,-0.100295873,0.5018820577,0.5054334091,-5.426471314,-3.372514011,-4.993508439,-5.416520387,7.4996250187,1.0936024258,-12.88003594,4.6136101499,-4.115432873,-9.704321456,-5.031818855,-3.273322422,-3.29571557,-4.21284919,7.4996250187,2.286623254,-12.88003594,4.5133142771,-3.613550816,-9.198888046 +050,3,7,22,023,Louisiana,Cameron Parish,6839,6868,6915,6672,6630,6711,6724,6821,6888,6935,7008,6981,7003,47,-243,-42,81,13,97,67,47,73,-27,22,18,76,52,53,70,70,70,77,72,78,74,18,40,39,44,35,50,57,45,56,55,77,0,36,13,9,35,20,13,32,16,23,-3,0,-1,-1,0,0,-2,-4,-3,-2,-6,-3,44,-281,-54,70,-20,78,59,18,60,-45,29,44,-282,-55,70,-20,76,55,15,58,-51,26,3,3,0,2,-2,1,-1,0,-1,1,-1,20,20,20,20,20,20,20,20,20,20,20,20,11.187164201,7.818373177,7.945431377,10.420543357,10.335917313,10.212269312,11.140852203,10.327763035,11.151619129,10.583524027,5.8879811585,5.8637798827,6.5962071809,5.2102716785,7.3827980805,8.3157050113,6.510887651,8.0327045829,7.8633211809,11.012585812,5.2991830426,1.9545932942,1.3492241961,5.2102716785,2.9531192322,1.8965643008,4.6299645518,2.2950584523,3.2882979484,-0.429061785,-0.147199529,-0.15035333,0,0,-0.295311923,-0.583558246,-0.434059177,-0.286882307,-0.857816856,-0.429061785,-41.36306764,-8.119079838,10.49396597,-2.977298102,11.517165006,8.6074841345,2.6043550604,8.606469196,-6.433626421,4.147597254,-41.51026717,-8.269433168,10.49396597,-2.977298102,11.221853082,8.0239258881,2.1702958837,8.3195868895,-7.291443277,3.7185354691 +050,3,7,22,025,Louisiana,Catahoula Parish,10407,10409,10379,10289,10243,10254,10133,10034,9863,9812,9571,9459,9226,-30,-90,-46,11,-121,-99,-171,-51,-241,-112,-233,30,125,111,141,128,118,127,129,108,100,99,43,131,114,153,139,155,143,127,132,101,127,-13,-6,-3,-12,-11,-37,-16,2,-24,-1,-28,1,20,5,20,11,21,1,1,1,1,1,-17,-104,-46,4,-121,-84,-155,-54,-218,-111,-205,-16,-84,-41,24,-110,-63,-154,-53,-217,-110,-204,-1,0,-2,-1,0,1,-1,0,0,-1,-1,866,866,865,865,865,866,866,866,866,866,866,866,12.095993807,10.812390415,13.758110943,12.557021631,11.702285913,12.765743579,13.113087675,11.143785792,10.509721492,10.596735349,12.67660151,11.104617183,14.929014002,13.636140678,15.37164675,14.374026235,12.90978399,13.620182634,10.614818707,13.593791812,-0.580607703,-0.292226768,-1.170903059,-1.079119046,-3.669360837,-1.608282656,0.2033036849,-2.476396843,-0.105097215,-2.997056462,1.9353590091,0.4870446133,1.9515050983,1.0791190465,2.0826102048,0.100517666,0.1016518424,0.1031832018,0.1050972149,0.1070377308,-10.06386685,-4.480810442,0.3903010197,-11.87030951,-8.330440819,-15.58023823,-5.489199492,-22.49393799,-11.66579086,-21.94273481,-8.128507838,-3.993765829,2.341806118,-10.79119046,-6.247830614,-15.47972056,-5.387547649,-22.39075479,-11.56069364,-21.83569708 +050,3,7,22,027,Louisiana,Claiborne Parish,17195,17195,17174,16940,16869,16665,16406,16271,16168,15964,15912,15718,15508,-21,-234,-71,-204,-259,-135,-103,-204,-52,-194,-210,40,163,180,162,184,160,181,150,133,123,118,18,202,193,201,190,178,203,200,181,177,209,22,-39,-13,-39,-6,-18,-22,-50,-48,-54,-91,2,22,4,5,0,1,4,1,0,2,1,-46,-219,-59,-174,-258,-118,-85,-154,-4,-142,-118,-44,-197,-55,-169,-258,-117,-81,-153,-4,-140,-117,1,2,-3,4,5,0,0,-1,0,0,-2,2917,2917,2917,2917,2916,2918,2922,2916,2923,2922,2927,2923,9.556193938,10.648052294,9.6618357488,11.127574007,9.7928206384,11.159406887,9.3364869912,8.3448362404,7.7774264938,7.5578043938,11.842645248,11.417078293,11.987833244,11.490429682,10.89451296,12.515798884,12.448649322,11.356506463,11.191906418,13.386280664,-2.28645131,-0.769025999,-2.325997495,-0.362855674,-1.101692322,-1.356391997,-3.11216233,-3.011670222,-3.414479924,-5.82847627,1.2897930468,0.2366233843,0.2982048071,0,0.061205129,0.2466167268,0.0622432466,0,0.1264622194,0.0640491898,-12.83930351,-3.490194919,-10.37752729,-15.60279399,-7.222205221,-5.240605444,-9.585459978,-0.250972519,-8.978817578,-7.557804394,-11.54951046,-3.253571534,-10.07932248,-15.60279399,-7.161000092,-4.993988717,-9.523216731,-0.250972519,-8.852355359,-7.493755204 +050,3,7,22,029,Louisiana,Concordia Parish,20822,20822,20840,20844,20502,20504,20484,20233,19971,19850,19618,19314,18914,18,4,-342,2,-20,-251,-262,-121,-232,-304,-400,70,247,301,258,253,266,260,267,266,245,243,33,244,211,255,270,251,263,240,259,242,256,37,3,90,3,-17,15,-3,27,7,3,-13,1,0,-4,-4,1,-4,1,-4,-4,-4,-2,-19,1,-438,5,0,-263,-261,-145,-235,-304,-381,-18,1,-442,1,1,-267,-260,-149,-239,-308,-383,-1,0,10,-2,-4,1,1,1,0,1,-4,1485,1485,1485,1485,1485,1485,1485,1481,1477,1479,1477,1480,11.851069955,14.560054177,12.583524362,12.345076608,13.065795614,12.934036414,13.410009794,13.479274349,12.586047467,12.713194517,11.707129834,10.206549606,12.437204312,13.174587684,12.329002628,13.083275296,12.053941388,13.124556603,12.4319326,13.393324265,0.1439401209,4.3535045712,0.1463200507,-0.829511076,0.7367929857,-0.149238882,1.3560684061,0.354717746,0.1541148669,-0.680129748,0,-0.193489092,-0.195093401,0.0487947692,-0.19647813,0.0497462939,-0.200899023,-0.202695855,-0.205486489,-0.104635346,0.0479800403,-21.18705558,0.2438667512,0,-12.91843702,-12.98378271,-7.282589588,-11.90838147,-15.61697318,-19.93303338,0.0479800403,-21.38054467,0.0487733502,0.0487947692,-13.11491515,-12.93403641,-7.483488612,-12.11107733,-15.82245967,-20.03766872 +050,3,7,22,031,Louisiana,De Soto Parish,26656,26656,26670,26782,27028,27096,27069,27112,27194,27281,27412,27440,27650,14,112,246,68,-27,43,82,87,131,28,210,57,338,398,348,331,363,332,338,307,318,316,100,273,298,282,283,296,296,309,308,297,316,-43,65,100,66,48,67,36,29,-1,21,0,2,3,1,2,2,-1,0,-2,-1,-1,0,54,44,150,4,-74,-22,49,62,136,6,210,56,47,151,6,-72,-23,49,60,135,5,210,1,0,-5,-4,-3,-1,-3,-2,-3,2,0,215,215,215,215,215,215,215,215,215,215,215,215,12.646860735,14.792789444,12.859359988,12.22191452,13.399531201,12.227009907,12.409362093,11.226299526,11.594837016,11.472136504,10.214772132,11.076008177,10.420515852,10.449552294,10.926339492,10.901189555,11.344653511,11.262867277,10.829140232,11.472136504,2.4320886029,3.7167812674,2.4388441357,1.7723622265,2.4731917093,1.3258203513,1.0647085819,-0.036567751,0.7656967841,0,0.1122502432,0.0371678127,0.0739043677,0.0738484261,-0.036913309,0,-0.073428178,-0.036567751,-0.036461752,0,1.6463369004,5.5751719011,0.1478087355,-2.732391766,-0.8120928,1.8045888115,2.27627352,4.9732141225,0.2187705097,7.623888183,1.7585871436,5.6123397138,0.2217131032,-2.65854334,-0.849006109,1.8045888115,2.2028453419,4.9366463716,0.1823087581,7.623888183 +050,3,7,22,033,Louisiana,East Baton Rouge Parish,440171,440531,440937,441627,443075,444345,445334,445776,447020,444848,442720,441471,439729,406,690,1448,1270,989,442,1244,-2172,-2128,-1249,-1742,1412,5998,6017,6131,6196,6198,6212,5965,5916,5704,5610,936,3457,3544,3696,3695,3834,3763,3874,3974,3969,4199,476,2541,2473,2435,2501,2364,2449,2091,1942,1735,1411,184,973,602,735,697,1060,1130,691,692,1078,862,-216,-2830,-1563,-1872,-2176,-2981,-2325,-4970,-4770,-4074,-4013,-32,-1857,-961,-1137,-1479,-1921,-1195,-4279,-4078,-2996,-3151,-38,6,-64,-28,-33,-1,-10,16,8,12,-2,11097,11101,11106,11117,11125,11122,11131,11120,11113,11115,11124,11126,13.592215409,13.602320329,13.817583557,13.928619199,13.910740537,13.915832956,13.376418932,13.330809583,12.902189685,12.732637313,7.8339927756,8.0117372855,8.3297649366,8.3063666783,8.6049982606,8.4296972657,8.6873842317,8.954806843,8.9776982575,9.5301861099,5.7582226331,5.5905830438,5.4878186203,5.6222525203,5.3057422765,5.4861356906,4.6890347002,4.3760027401,3.9244914278,3.2024512029,2.2049392452,1.3609102274,1.6564873453,1.5668572598,2.3790553355,2.5313733484,1.5495566609,1.5593171453,2.4383871811,1.9564230595,-6.413132645,-3.533393165,-4.218971851,-4.891651933,-6.690532033,-5.208356668,-11.14514704,-10.74847223,-9.215203502,-9.108034498,-4.2081934,-2.172482938,-2.562484506,-3.324794673,-4.311476698,-2.67698332,-9.595590379,-9.189155084,-6.776816321,-7.151611439 +050,3,7,22,035,Louisiana,East Carroll Parish,7759,7759,7737,7658,7578,7499,7444,7279,7230,7117,6971,6829,6589,-22,-79,-80,-79,-55,-165,-49,-113,-146,-142,-240,23,126,127,115,139,114,94,119,71,73,69,6,82,65,108,83,83,85,86,87,64,76,17,44,62,7,56,31,9,33,-16,9,-7,0,-2,-1,-1,-1,-1,-1,-2,-2,-2,-2,-40,-122,-145,-84,-113,-197,-57,-144,-128,-148,-228,-40,-124,-146,-85,-114,-198,-58,-146,-130,-150,-230,1,1,4,-1,3,2,0,0,0,-1,-3,1067,1067,1067,1067,1067,1067,1067,1067,1066,1066,1067,1067,16.368950958,16.671042268,15.255024209,18.604028642,15.485974326,12.957474671,16.588833903,10.079500284,10.579710145,10.284692205,10.652809354,8.5324232082,14.326457518,11.108880412,11.274876044,11.716865394,11.988569039,12.350936968,9.2753623188,11.328066776,5.7161416044,8.1386190601,0.928566691,7.4951482299,4.2110982816,1.240609277,4.6002648637,-2.271436684,1.3043478261,-1.043374571,-0.259824618,-0.131268049,-0.132652384,-0.133841933,-0.13584188,-0.137845475,-0.278803931,-0.283929585,-0.289855072,-0.29810702,-15.84930172,-19.03386716,-11.14280029,-15.12413839,-26.76085037,-7.857192088,-20.07388304,-18.17149347,-21.44927536,-33.98420033,-16.10912634,-19.16513521,-11.27545268,-15.25798033,-26.89669225,-7.995037563,-20.35268697,-18.45542306,-21.73913043,-34.28230735 +050,3,7,22,037,Louisiana,East Feliciana Parish,20267,20254,20150,20079,19852,19596,19672,19534,19500,19383,19272,19103,18882,-104,-71,-227,-256,76,-138,-34,-117,-111,-169,-221,62,202,209,213,221,218,197,220,209,167,172,83,184,237,261,239,244,232,273,257,218,246,-21,18,-28,-48,-18,-26,-35,-53,-48,-51,-74,0,-2,-1,-2,-2,0,4,3,3,4,4,-86,-87,-202,-205,100,-110,-1,-66,-65,-122,-150,-86,-89,-203,-207,98,-110,3,-63,-62,-118,-146,3,0,4,-1,-4,-2,-2,-1,-1,0,-1,2399,2399,2400,2400,2401,2403,2401,2406,2408,2406,2418,2417,10.042506649,10.468057399,10.799026567,11.255984517,11.120746824,10.093764411,11.31599928,10.813607554,8.7035830619,9.0562063973,9.1476298193,11.870476572,13.232610018,12.172761536,12.447074427,11.887072808,14.042126379,13.297115509,11.361563518,12.952481243,0.8948768301,-1.402419173,-2.433583452,-0.916777019,-1.326327603,-1.793308398,-2.726127099,-2.483507955,-2.657980456,-3.896274845,-0.099430759,-0.050086399,-0.10139931,-0.101864113,0,0.2049495312,0.1543090811,0.1552192472,0.2084690554,0.2106094511,-4.325238012,-10.11745261,-10.39342932,5.0932056636,-5.611386012,-0.051237383,-3.394799784,-3.363083689,-6.358306189,-7.897854416,-4.424668771,-10.167539,-10.49482864,4.9913415504,-5.611386012,0.1537121484,-3.240490703,-3.207864442,-6.149837134,-7.687244965 +050,3,7,22,039,Louisiana,Evangeline Parish,33984,33986,33954,33840,33745,33824,33759,33728,33671,33655,33457,33396,33276,-32,-114,-95,79,-65,-31,-57,-16,-198,-61,-120,119,465,504,466,486,493,505,473,470,508,480,131,361,346,375,362,372,390,346,386,401,422,-12,104,158,91,124,121,115,127,84,107,58,2,58,44,70,79,71,77,53,57,77,62,-17,-276,-303,-78,-269,-223,-248,-197,-338,-246,-240,-15,-218,-259,-8,-190,-152,-171,-144,-281,-169,-178,-5,0,6,-4,1,0,-1,1,-1,1,0,1379,1379,1379,1379,1379,1380,1380,1380,1379,1380,1379,1379,13.718028144,14.914552046,13.793307582,14.382315079,14.610221228,14.98538554,14.051035261,14.006437001,15.197522923,14.398848092,10.649910022,10.238958349,11.099764685,10.712753207,11.024345429,11.572872001,10.278347147,11.503158899,11.996469867,12.658987281,3.0681181225,4.6755936968,2.6935428969,3.6695618721,3.5858757983,3.4125135388,3.7726881145,2.5032781023,3.2010530567,1.7398608111,1.711065876,1.3020640675,2.0719560745,2.3378660314,2.1041089395,2.2849003694,1.5744288982,1.698652998,2.3035615455,1.8598512119,-8.142313479,-8.966486646,-2.308751054,-7.960581803,-6.60868019,-7.359159631,-5.852122508,-10.07271427,-7.359430392,-7.199424046,-6.431247603,-7.664422579,-0.23679498,-5.622715772,-4.504571251,-5.074259262,-4.27769361,-8.374061271,-5.055868847,-5.339572834 +050,3,7,22,041,Louisiana,Franklin Parish,20767,20767,20810,20774,20580,20519,20441,20397,20393,20265,20170,19996,19723,43,-36,-194,-61,-78,-44,-4,-128,-95,-174,-273,79,292,297,263,283,278,322,275,266,255,245,44,263,262,283,292,270,287,271,250,289,294,35,29,35,-20,-9,8,35,4,16,-34,-49,0,1,0,2,1,1,1,1,1,1,1,10,-65,-237,-38,-66,-51,-39,-133,-112,-141,-222,10,-64,-237,-36,-65,-50,-38,-132,-111,-140,-221,-2,-1,8,-5,-4,-2,-1,0,0,0,-3,732,732,732,732,732,732,732,732,732,732,732,732,14.043863024,14.363785849,12.798364924,13.818359375,13.614770557,15.788183378,13.527473068,13.156918511,12.697306179,12.336665072,12.649095806,12.671083813,13.771624614,14.2578125,13.222978598,14.072076489,13.330709823,12.365524917,14.390280337,14.803998087,1.3947672182,1.6927020361,-0.97325969,-0.439453125,0.3917919585,1.7161068889,0.1967632446,0.7913935947,-1.692974157,-2.467333014,0.0480954213,0,0.097325969,0.048828125,0.0489739948,0.0490316254,0.0491908112,0.0494620997,0.0497933576,0.050353735,-3.126202386,-11.46201093,-1.849193411,-3.22265625,-2.497673735,-1.912233391,-6.542377884,-5.539755163,-7.020863417,-11.17852917,-3.078106964,-11.46201093,-1.751867442,-3.173828125,-2.44869974,-1.863201765,-6.493187073,-5.490293063,-6.971070059,-11.12817543 +050,3,7,22,043,Louisiana,Grant Parish,22309,22318,22346,22397,22402,22317,22377,22327,22324,22330,22430,22352,22254,28,51,5,-85,60,-50,-3,6,100,-78,-98,69,241,255,234,288,238,259,229,262,246,242,78,195,208,231,204,207,229,188,252,220,209,-9,46,47,3,84,31,30,41,10,26,33,3,17,0,21,12,7,19,5,4,10,9,33,-12,-36,-107,-32,-86,-51,-38,85,-114,-140,36,5,-36,-86,-20,-79,-32,-33,89,-104,-131,1,0,-6,-2,-4,-2,-1,-2,1,0,0,2937,2941,2939,2945,2950,2950,2956,2955,2961,2961,2962,2960,10.772634826,11.384182683,10.465350299,12.887635924,10.64781675,11.601083962,10.256639943,11.706881144,10.986557099,10.850558221,8.7164472655,9.2859215607,10.331179141,9.128742113,9.2609162491,10.257329063,8.4202982935,11.260053619,9.8253762673,9.3709366453,2.0561875601,2.0982611219,0.1341711577,3.7588938112,1.3869005011,1.3437548991,1.8363416491,0.4468275246,1.1611808316,1.4796215756,0.7598954026,0,0.9391981037,0.5369848302,0.3131710809,0.8510447694,0.2239441036,0.1787310098,0.4466080121,0.403533157,-0.536396755,-1.607178732,-4.785437957,-1.431959547,-3.847530422,-2.284383328,-1.701975187,3.7980339589,-5.091331338,-6.277182442,0.2234986478,-1.607178732,-3.846239853,-0.894974717,-3.534359341,-1.433338559,-1.478031083,3.9767649687,-4.644723326,-5.873649285 +050,3,7,22,045,Louisiana,Iberia Parish,73240,72856,72882,73216,73446,73628,73518,73548,72753,71805,70627,69638,68991,26,334,230,182,-110,30,-795,-948,-1178,-989,-647,253,1090,984,1089,1072,1160,1051,1055,952,917,888,141,656,675,756,744,731,737,738,803,741,836,112,434,309,333,328,429,314,317,149,176,52,14,216,38,154,89,39,70,18,11,50,41,-100,-317,-100,-303,-532,-438,-1183,-1287,-1342,-1214,-736,-86,-101,-62,-149,-443,-399,-1113,-1269,-1331,-1164,-695,0,1,-17,-2,5,0,4,4,4,-1,-4,944,944,944,944,944,944,944,944,944,944,944,944,14.921491054,13.418608774,14.808871724,14.570562571,15.775230169,14.367639319,14.596217435,13.367782521,13.075250419,12.811172266,8.980273515,9.2048383358,10.280539048,10.112405366,9.9411148736,10.075119104,10.210434566,11.275556055,10.565714897,12.060968484,5.9412175389,4.2137704382,4.5283326761,4.4581572044,5.8341152952,4.2925202152,4.3857828692,2.092226466,2.509535522,0.7502037813,2.9569193281,0.5181983063,2.0941838802,1.2096829,0.5303741177,0.9569312582,0.2490349894,0.154459672,0.7129362279,0.5915068276,-4.339552903,-1.363679753,-4.120374777,-7.230913514,-5.956509322,-16.17213826,-17.80600174,-18.84407998,-17.31009161,-10.6182689,-1.382633575,-0.845481447,-2.026190897,-6.021230614,-5.426135205,-15.215207,-17.55696675,-18.68962031,-16.59715538,-10.02676208 +050,3,7,22,047,Louisiana,Iberville Parish,33387,33404,33389,33364,33332,33395,33142,33149,32865,32927,32719,32549,32070,-15,-25,-32,63,-253,7,-284,62,-208,-170,-479,85,425,451,432,375,398,367,388,379,383,377,42,284,284,335,356,354,348,344,341,332,339,43,141,167,97,19,44,19,44,38,51,38,5,25,9,22,-4,-4,-1,-1,-2,0,0,-62,-191,-208,-50,-271,-29,-302,20,-243,-221,-514,-57,-166,-199,-28,-275,-33,-303,19,-245,-221,-514,-1,0,0,-6,3,-4,0,-1,-1,0,-3,3999,3997,3997,3996,4002,3998,3996,3985,3983,3987,3987,3988,12.733510104,13.524049418,12.948281805,11.271923892,12.007663182,11.118853577,11.794747082,11.54678122,11.736226022,11.668394745,8.5089808698,8.5162528487,10.040912974,10.700813081,10.68018283,10.543218105,10.457198444,10.389056454,10.173438745,10.492270075,4.2245292346,5.0077965695,2.9073688312,0.5711108105,1.3274803518,0.5756354713,1.3375486381,1.1577247662,1.5627872771,1.1761246692,0.7490300061,0.2698812522,0.6594032401,-0.120233855,-0.120680032,-0.030296604,-0.030398833,-0.060932882,0,0,-5.722589247,-6.237255608,-1.498643727,-8.145843666,-0.874930232,-9.149574333,0.6079766537,-7.403345215,-6.772078201,-15.90863368,-4.973559241,-5.967374355,-0.839240487,-8.266077521,-0.995610264,-9.179870936,0.577577821,-7.464278098,-6.772078201,-15.90863368 +050,3,7,22,049,Louisiana,Jackson Parish,16274,16274,16309,16362,16280,16150,16013,15971,15903,15927,15944,15761,15574,35,53,-82,-130,-137,-42,-68,24,17,-183,-187,47,205,173,169,166,200,156,174,163,140,133,23,180,157,200,213,177,193,195,198,199,242,24,25,16,-31,-47,23,-37,-21,-35,-59,-109,0,0,-1,-2,2,2,5,2,1,-1,1,13,29,-96,-96,-90,-65,-35,44,51,-124,-79,13,29,-97,-98,-88,-63,-30,46,52,-125,-78,-2,-1,-1,-1,-2,-2,-1,-1,0,1,0,1038,1038,1038,1038,1038,1038,1038,1037,1037,1037,1037,1037,12.549355698,10.599840696,10.42244835,10.322420172,12.506253127,9.7885423856,10.933081998,10.228734586,8.8314146034,8.4889101644,11.018946466,9.6195086085,12.334258403,13.245033113,11.068034017,12.110183849,12.252591894,12.425088639,12.553225043,15.445986916,1.5304092314,0.9803320875,-1.911810052,-2.92261294,1.4382191096,-2.321641463,-1.319509896,-2.196354052,-3.72181044,-6.957076751,0,-0.061270755,-0.123342584,0.1243665081,0.1250625313,0.3137353329,0.1256676092,0.0627529729,-0.063081533,0.0638263922,1.7752747085,-5.881992525,-5.920444033,-5.596492864,-4.064532266,-2.19614733,2.7646874018,3.200401619,-7.822110077,-5.042284985,1.7752747085,-5.94326328,-6.043786617,-5.472126356,-3.939469735,-1.882411997,2.890355011,3.2631545919,-7.88519161,-4.978458593 +050,3,7,22,051,Louisiana,Jefferson Parish,432552,432576,432618,434133,434049,434394,434235,435358,436865,436571,434637,434096,432346,42,1515,-84,345,-159,1123,1507,-294,-1934,-541,-1750,1358,5833,5616,5616,5806,6001,6033,5816,5738,5588,5467,902,3931,3993,4267,4117,4024,4126,4291,4356,4349,4679,456,1902,1623,1349,1689,1977,1907,1525,1382,1239,788,320,1777,950,1338,1206,1738,1777,1265,1375,1872,1474,-732,-2159,-2635,-2306,-3024,-2569,-2161,-3070,-4690,-3646,-4000,-412,-382,-1685,-968,-1818,-831,-384,-1805,-3315,-1774,-2526,-2,-5,-22,-36,-30,-23,-16,-14,-1,-6,-12,3311,3311,3311,3311,3312,3314,3316,3313,3313,3312,3313,3311,13.459459522,12.93737949,12.933491317,13.368192865,13.801859031,13.833618238,13.317518399,13.172514486,12.864712173,12.619425189,9.070655817,9.198532105,9.8267819535,9.4793058947,9.2549043058,9.4608832833,9.8255624911,9.9999081735,10.012282255,10.800492128,4.3888037049,3.7388473845,3.1067093638,3.8888869702,4.5469547248,4.3727349542,3.4919559075,3.1726063122,2.8524299181,1.8189330619,4.1003702332,2.1884812171,3.0813766707,2.7767896306,3.9972722872,4.0746460481,2.8966060478,3.1565366709,4.3097246219,3.4024204736,-4.981822923,-6.070155797,-5.310653664,-6.962696387,-5.908511223,-4.955154817,-7.029707958,-10.76665963,-8.393833318,-9.233162751,-0.881452689,-3.88167458,-2.229276993,-4.185906757,-1.911238936,-0.880508769,-4.13310191,-7.610122956,-4.084108696,-5.830742277 +050,3,7,22,053,Louisiana,Jefferson Davis Parish,31594,31589,31629,31595,31452,31305,31462,31449,31399,31502,31574,31444,31208,40,-34,-143,-147,157,-13,-50,103,72,-130,-236,98,396,453,427,440,457,436,425,413,411,398,56,339,363,394,376,363,367,391,417,384,432,42,57,90,33,64,94,69,34,-4,27,-34,2,9,3,4,5,4,13,9,8,11,9,-1,-99,-236,-186,95,-110,-131,62,69,-168,-212,1,-90,-233,-182,100,-106,-118,71,77,-157,-203,-3,-1,0,2,-7,-1,-1,-2,-1,0,1,567,567,567,567,567,567,567,567,567,567,567,567,12.526888523,14.370231732,13.608043724,14.020106107,14.528460842,13.874745418,13.513298676,13.09531359,13.043892221,12.705101194,10.723775781,11.515218805,12.556368214,11.980817946,11.540112222,11.678971487,12.432234782,13.222144714,12.186994192,13.790461597,1.803112742,2.8550129269,1.0516755103,2.039288161,2.9883486195,2.1957739308,1.0810638941,-0.126831124,0.8568980291,-1.085360403,0.2847020119,0.0951670976,0.1274758194,0.1593193876,0.127163771,0.4136965377,0.286163972,0.2536622487,0.3491066045,0.2873012833,-3.131722131,-7.486478342,-5.927625604,3.0270683639,-3.497003704,-4.168788187,1.9713518068,2.1878368952,-5.331809959,-6.767541339,-2.847020119,-7.391311244,-5.800149784,3.1863877515,-3.369839933,-3.75509165,2.2575157788,2.4414991439,-4.982703355,-6.480240056 +050,3,7,22,055,Louisiana,Lafayette Parish,221578,221970,222513,224898,227554,231757,235999,239654,241611,242039,243493,244798,246518,543,2385,2656,4203,4242,3655,1957,428,1454,1305,1720,754,3084,3130,3407,3492,3482,3477,3369,3283,3194,3157,336,1638,1626,1693,1655,1760,1738,1748,1791,2026,2188,418,1446,1504,1714,1837,1722,1739,1621,1492,1168,969,79,611,237,386,292,354,378,162,158,323,260,65,333,924,2058,2078,1580,-148,-1359,-193,-196,471,144,944,1161,2444,2370,1934,230,-1197,-35,127,731,-19,-5,-9,45,35,-1,-12,4,-3,10,20,5150,5150,5153,5158,5158,5159,5163,5161,5155,5156,5161,5160,13.785982017,13.8357218,14.835264124,14.930861389,14.640925212,14.449419758,13.93156208,13.523310513,13.082362771,12.851199635,7.3221266352,7.1875027627,7.3719114064,7.0763389459,7.4003527782,7.2226320219,7.2283676212,7.3774746052,8.2983302989,8.9066914165,6.4638553813,6.6482190376,7.4633527174,7.8545224433,7.2405724341,7.2267877365,6.7031944588,6.1458359078,4.7840324724,3.9445082187,2.7312694592,1.0476249414,1.6807783833,1.2485141826,1.4884800474,1.570860129,0.6699059237,0.6508324889,1.3229815827,1.0583819782,1.4885642061,4.0844111641,8.9612484787,8.8849742173,6.6434985168,-0.615045765,-5.61976636,-0.795004243,-0.80279997,1.9172996605,4.2198336652,5.1320361055,10.642026862,10.1334884,8.1319785642,0.9558143642,-4.949860436,-0.144171754,0.520181613,2.9756816387 +050,3,7,22,057,Louisiana,Lafourche Parish,96318,96591,96693,97031,97131,97235,97849,98279,98493,98078,97910,97618,97596,102,338,100,104,614,430,214,-415,-168,-292,-22,293,1169,1232,1211,1253,1325,1331,1207,1211,1141,1116,156,795,855,903,939,881,877,907,958,905,984,137,374,377,308,314,444,454,300,253,236,132,32,224,83,137,97,108,109,49,48,96,74,-63,-258,-352,-335,220,-110,-348,-764,-471,-624,-233,-31,-34,-269,-198,317,-2,-239,-715,-423,-528,-159,-4,-2,-8,-6,-17,-12,-1,0,2,0,5,1625,1625,1625,1626,1627,1626,1626,1626,1626,1627,1627,1627,12.068716318,12.690433761,12.461027134,12.845748498,13.511584271,13.528347529,12.28055003,12.357899463,11.670962727,11.433606196,8.2075530136,8.8070786251,9.2917485568,9.6266223781,8.9839288628,8.9138698595,9.2282177941,9.7761087414,9.2569862117,10.081244173,3.8611633045,3.8833551364,3.1692785775,3.21912612,4.5276554087,4.6144776696,3.0523322362,2.5817907219,2.4139765149,1.3523620232,2.3125683963,0.8549561706,1.4097115751,0.9944434192,1.1013215859,1.1078812026,0.4985475986,0.4898259077,0.9819565484,0.7581423463,-2.663583242,-3.625838218,-3.447104946,2.2554386828,-1.12171643,-3.53708861,-7.773272761,-4.806416719,-6.382717565,-2.387123874,-0.351014846,-2.770882047,-2.037393371,3.2498821021,-0.020394844,-2.429207408,-7.274725163,-4.316590812,-5.400761016,-1.628981528 +050,3,7,22,059,Louisiana,LaSalle Parish,14890,14888,14909,14941,14860,14819,14873,14975,15028,14893,14900,14910,15021,21,32,-81,-41,54,102,53,-135,7,10,111,46,170,150,181,185,170,186,190,188,170,176,58,160,160,192,166,141,158,186,174,150,191,-12,10,-10,-11,19,29,28,4,14,20,-15,1,11,4,24,15,10,17,6,6,12,7,32,11,-73,-51,23,64,9,-146,-12,-22,119,33,22,-69,-27,38,74,26,-140,-6,-10,126,0,0,-2,-3,-3,-1,-1,1,-1,0,0,1243,1243,1243,1243,1243,1243,1243,1243,1241,1241,1240,1240,11.390284757,10.066776283,12.197176455,12.461269029,11.391047976,12.398760124,12.70011029,12.620414191,11.405568601,11.760382212,10.720268007,10.737894702,12.938441322,11.18146302,9.447869204,10.532280105,12.432739547,11.680596113,10.063737001,12.762687515,0.6700167504,-0.671118419,-0.741264867,1.2798060084,1.9431787724,1.8664800187,0.267370743,0.9398180781,1.3418316001,-1.002305302,0.7370184255,0.2684473675,1.6173051653,1.0103731645,0.6700616457,1.1332200113,0.4010561144,0.4027791763,0.8050989601,0.4677424744,0.7370184255,-4.899164458,-3.436773476,1.5492388522,4.2883945323,0.599940006,-9.759032118,-0.805558353,-1.47601476,7.9516220641,1.4740368509,-4.63071709,-1.819468311,2.5596120167,4.958456178,1.7331600173,-9.357976003,-0.402779176,-0.6709158,8.4193645384 +050,3,7,22,061,Louisiana,Lincoln Parish,46735,46740,46854,47068,47039,47257,47227,47469,47520,47494,47174,46851,46552,114,214,-29,218,-30,242,51,-26,-320,-323,-299,126,574,570,591,565,588,595,573,543,504,502,67,359,309,388,397,390,341,398,420,410,452,59,215,261,203,168,198,254,175,123,94,50,44,229,117,139,132,156,166,73,70,117,91,14,-232,-407,-124,-334,-109,-370,-277,-514,-536,-439,58,-3,-290,15,-202,47,-204,-204,-444,-419,-348,-3,2,0,0,4,-3,1,3,1,2,-1,4883,4890,4894,4907,4914,4908,4918,4910,4897,4895,4904,4904,12.222908371,12.113870382,12.534996182,11.95969688,12.418687167,12.527766373,12.061380428,11.471669413,10.720553044,10.749119407,7.6446412981,6.5669928911,8.229405277,8.4035392236,8.2368843457,7.1797787112,8.3777127581,8.8731144632,8.7210848179,9.6784899843,4.5782670727,5.5468774905,4.3055909052,3.5561576563,4.1818028217,5.3479876617,3.68366767,2.5985549499,1.9994682265,1.070629423,4.876386789,2.4865312889,2.9481632307,2.7941238728,3.2947537383,3.4951415427,1.5366156566,1.4788524105,2.4886998139,1.9485455499,-4.940269585,-8.649728501,-2.630016119,-7.069980102,-2.302103574,-7.790375728,-5.830719683,-10.85900199,-11.40122308,-9.400126334,-0.063882796,-6.163197212,0.3181471112,-4.27585623,0.9926501647,-4.295234185,-4.294104027,-9.380149575,-8.912523265,-7.451580784 +050,3,7,22,063,Louisiana,Livingston Parish,128026,127688,128351,129858,131521,133726,135241,137202,139822,137907,139594,141561,143737,663,1507,1663,2205,1515,1961,2620,-1915,1687,1967,2176,445,1769,1792,1826,1894,1865,1967,1777,1872,1753,1775,190,912,921,1058,1067,1086,1079,1072,1137,1135,1269,255,857,871,768,827,779,888,705,735,618,506,15,69,-12,31,5,22,75,59,71,59,55,369,581,808,1386,689,1158,1655,-2692,882,1290,1622,384,650,796,1417,694,1180,1730,-2633,953,1349,1677,24,0,-4,20,-6,2,2,13,-1,0,-7,1192,1192,1192,1192,1192,1192,1192,1192,1191,1190,1189,1189,13.702078549,13.711889632,13.768298982,14.083512104,13.690937187,14.200935659,12.796647091,13.491843273,12.469989863,12.44312964,7.0640450178,7.0472379189,7.9774700562,7.9340588251,7.9723098043,7.7899387779,7.7197555891,8.1945650646,8.0738382743,8.8959614158,6.638033531,6.6646517126,5.7908289255,6.1494532787,5.7186273826,6.4109968811,5.0768915021,5.297278208,4.396151589,3.5471682241,0.5344507744,-0.091820689,0.2337443967,0.0371792822,0.1615016719,0.5414693312,0.424874608,0.5117098677,0.41969732,0.3855617635,4.5002304335,6.1825930928,10.450636576,5.1233050895,8.5008607305,11.948423241,-19.38580415,6.3567338496,9.1764329285,11.370566916,5.0346812079,6.0907724033,10.684380973,5.1604843717,8.6623624024,12.489892572,-18.96092954,6.8684437173,9.5961302484,11.756128679 +050,3,7,22,065,Louisiana,Madison Parish,12093,12101,12107,11978,12215,11912,11826,11560,11497,11349,11212,10994,10635,6,-129,237,-303,-86,-266,-63,-148,-137,-218,-359,33,187,192,168,180,176,158,142,174,146,137,17,144,128,112,135,144,131,128,139,120,157,16,43,64,56,45,32,27,14,35,26,-20,0,-1,-1,0,0,0,0,0,0,0,0,-8,-172,167,-370,-133,-300,-89,-164,-173,-244,-335,-8,-173,166,-370,-133,-300,-89,-164,-173,-244,-335,-2,1,7,11,2,2,-1,2,1,0,-4,1597,1597,1597,1597,1596,1597,1596,1596,1596,1597,1599,1600,15.528337139,15.872359773,13.926306627,15.165557334,15.051740357,13.70516546,12.431060142,15.424848189,13.149599207,12.668176985,11.95764999,10.581573182,9.2842044183,11.374168001,12.315060292,11.363143514,11.205462663,12.322148841,10.80788976,14.517545887,3.5706871497,5.2907865912,4.6421022091,3.7913893336,2.736680065,2.3420219456,1.2255974788,3.1026993484,2.3417094479,-1.849368903,-0.083039236,-0.08266854,0,0,0,0,0,0,0,0,-14.2827486,13.805646261,-30.67103245,-11.20566181,-25.65637561,-7.719998265,-14.35699904,-15.33619964,-21.97604251,-30.97692912,-14.36578783,13.722977721,-30.67103245,-11.20566181,-25.65637561,-7.719998265,-14.35699904,-15.33619964,-21.97604251,-30.97692912 +050,3,7,22,067,Louisiana,Morehouse Parish,27979,27979,27873,27482,27378,26938,26654,26307,25911,25664,25304,24839,24227,-106,-391,-104,-440,-284,-347,-396,-247,-360,-465,-612,92,384,365,335,374,377,371,353,328,305,293,135,386,365,376,382,388,357,344,402,343,363,-43,-2,0,-41,-8,-11,14,9,-74,-38,-70,1,8,6,8,5,-1,0,-1,-1,-1,0,-67,-398,-110,-412,-286,-337,-409,-256,-285,-426,-538,-66,-390,-104,-404,-281,-338,-409,-257,-286,-427,-538,3,1,0,5,5,2,-1,1,0,0,-4,768,768,768,768,768,768,768,768,768,768,768,768,13.874085448,13.306598615,12.335223507,13.957307061,14.236891297,14.209659504,13.688802714,12.870820907,12.165207507,11.943097053,13.94634631,13.306598615,13.844907578,14.255859083,14.652291309,13.673445938,13.339796413,15.774603673,13.680872704,14.79639669,-0.072260862,0,-1.509684071,-0.298552023,-0.415400011,0.5362135662,0.3490063015,-2.903782766,-1.515665198,-2.853299637,0.2890434468,0.2187386074,0.2945725017,0.1865950142,-0.037763637,0,-0.038778478,-0.039240308,-0.039885926,0,-14.37991148,-4.010207802,-15.17048384,-10.67323481,-12.7263458,-15.66509633,-9.927290354,-11.18348768,-16.99140458,-21.92964578,-14.09086803,-3.791469194,-14.87591133,-10.4866398,-12.76410944,-15.66509633,-9.966068832,-11.22272799,-17.03129051,-21.92964578 +050,3,7,22,069,Louisiana,Natchitoches Parish,39566,39563,39523,39385,39341,39122,39131,39018,39016,39051,38623,38179,37655,-40,-138,-44,-219,9,-113,-2,35,-428,-444,-524,117,565,530,557,529,507,505,539,458,456,440,124,378,370,387,374,397,428,438,398,391,424,-7,187,160,170,155,110,77,101,60,65,16,1,20,-2,28,12,31,31,18,17,26,21,-29,-346,-196,-422,-154,-251,-109,-82,-507,-535,-557,-28,-326,-198,-394,-142,-220,-78,-64,-490,-509,-536,-5,1,-6,5,-4,-3,-1,-2,2,0,-4,2190,2191,2194,2197,2198,2198,2199,2199,2195,2192,2196,2196,14.320474477,13.464420903,14.197774747,13.520248425,12.975214014,12.943076095,13.808651543,11.792877926,11.874690763,11.604293589,9.5807776144,9.3996900643,9.8645221315,9.5587389621,10.160078824,10.969577364,11.221130567,10.24795942,10.18202651,11.182319276,4.7396968622,4.0647308386,4.3332526159,3.9615094629,2.8151351905,1.9734987313,2.5875209756,1.5449185055,1.6926642535,0.4219743123,0.5069194505,-0.050809135,0.7137121956,0.3066975068,0.793356281,0.7945254633,0.4611423521,0.4377269099,0.6770657014,0.5538412849,-8.769706494,-4.979295277,-10.75666238,-3.935951337,-6.423626662,-2.793654048,-2.100759604,-13.05456137,-13.93192886,-14.68998075,-8.262787043,-5.030104413,-10.04295018,-3.629253831,-5.630270381,-1.999128585,-1.639617252,-12.61683446,-13.25486315,-14.13613946 +050,3,7,22,071,Louisiana,Orleans Parish,343829,343828,347789,360822,369947,378863,384228,390094,392265,391819,391506,391172,389476,3961,13033,9125,8916,5365,5866,2171,-446,-313,-334,-1696,1034,4667,4699,4729,4974,5047,5030,4690,4695,4514,4445,646,2858,2978,3113,3162,3189,3166,3360,3488,3491,3961,388,1809,1721,1616,1812,1858,1864,1330,1207,1023,484,171,863,679,750,689,972,792,434,441,696,561,3094,10269,6476,6336,2786,2995,-472,-2197,-1950,-2053,-2741,3265,11132,7155,7086,3475,3967,320,-1763,-1509,-1357,-2180,308,92,249,214,78,41,-13,-13,-11,0,0,13165,13169,13343,13442,13412,13397,13441,13444,13458,13482,13526,13521,13.172248243,12.860425114,12.630707389,13.036453057,13.035920457,12.858547035,11.963003964,11.987361568,11.534756311,11.387975118,8.0664849967,8.1503183633,8.3145257141,8.2873471185,8.2368833638,8.0934711558,8.5705103025,8.9056266556,8.9206544709,10.147979627,5.1057632467,4.7101067506,4.3161816749,4.7491059389,4.7990370931,4.7650758795,3.3924936614,3.0817349121,2.6141018401,1.2399954909,2.4357510679,1.8583163763,2.0031783764,1.8058134613,2.5105834524,2.0246459745,1.1070242474,1.1259694252,1.7785091698,1.4372675008,28.983462012,17.723795071,16.922850923,7.301881427,7.7357998352,-1.206607197,-5.603991409,-4.97877637,-5.246090985,-7.022371158,31.41921308,19.582111447,18.9260293,9.1076948883,10.246383288,0.8180387776,-4.496967162,-3.852806945,-3.467581815,-5.585103657 +050,3,7,22,073,Louisiana,Ouachita Parish,153720,153732,153966,154654,155265,156075,156383,156916,156948,155913,154694,153401,152439,234,688,611,810,308,533,32,-1035,-1219,-1293,-962,502,2303,2334,2202,2357,2303,2243,2181,2119,2013,1985,272,1508,1425,1482,1557,1534,1594,1553,1649,1681,1777,230,795,909,720,800,769,649,628,470,332,208,28,143,51,103,86,95,93,61,56,95,86,-12,-245,-328,15,-561,-314,-705,-1726,-1753,-1719,-1256,16,-102,-277,118,-475,-219,-612,-1665,-1697,-1624,-1170,-12,-5,-21,-28,-17,-17,-5,2,8,-1,0,5534,5534,5539,5544,5543,5545,5548,5538,5541,5539,5546,5546,14.924502625,15.062000071,14.145307381,15.08682767,14.701610921,14.292814722,13.942293862,13.644251417,13.067398043,12.980643474,9.7725358045,9.1959512002,9.5201387551,9.9661394491,9.7925623765,10.157265567,9.9277314846,10.617919107,10.912218634,11.62045514,5.15196682,5.8660488708,4.6251686259,5.1206882205,4.9090485447,4.135549155,4.0145623775,3.0263323106,2.1551794089,1.3601883338,0.9267059815,0.3291182535,0.6616560673,0.5504739837,0.6064494301,0.5926133612,0.3899495303,0.3605842753,0.6166929032,0.5623855611,-1.587713045,-2.116682101,0.0963576797,-3.590882615,-2.004474958,-4.492391609,-11.03365392,-11.28757562,-11.1588958,-8.213444939,-0.661007064,-1.787563847,0.758013747,-3.040408631,-1.398025528,-3.899778248,-10.64370439,-10.92699134,-10.54220289,-7.651059377 +050,3,7,22,075,Louisiana,Plaquemines Parish,23042,23037,23120,23588,23836,23520,23323,23462,23360,23376,23411,23264,23113,83,468,248,-316,-197,139,-102,16,35,-147,-151,68,298,278,318,312,311,296,286,277,263,257,12,176,182,196,175,178,176,192,200,168,206,56,122,96,122,137,133,120,94,77,95,51,-1,-3,24,16,28,45,37,12,12,29,24,30,348,130,-462,-372,-38,-261,-89,-54,-272,-225,29,345,154,-446,-344,7,-224,-77,-42,-243,-201,-2,1,-2,8,10,-1,2,-1,0,1,-1,272,272,272,272,272,272,272,272,272,272,272,272,12.760126745,11.724021592,13.430188361,13.321093867,13.294859464,12.643629063,12.238959261,11.840895975,11.269416176,11.083079975,7.5361822386,7.6754385965,8.2777261593,7.4717673932,7.6092764775,7.5178334971,8.2163642588,8.5493833757,7.1987145153,8.8837139099,5.2239445063,4.048582996,5.1524622012,5.8493264735,5.685582986,5.1257955662,4.0225950017,3.2915125997,4.0707016604,2.1993660651,-0.128457652,1.012145749,0.6757327477,1.1954827829,1.9236934915,1.5804536329,0.5135227662,0.5129630025,1.2426352437,1.0349957953,14.901087608,5.4824561404,-19.51178309,-15.88284269,-1.624452282,-11.14860536,-3.808627182,-2.308333511,-11.6550616,-9.703085581,14.772629956,6.4946018893,-18.83605034,-14.6873599,0.2992412098,-9.568151724,-3.295104416,-1.795370509,-10.41242635,-8.668089786 +050,3,7,22,077,Louisiana,Pointe Coupee Parish,22802,22800,22814,22804,22676,22424,22309,22197,22126,22170,21856,21735,21529,14,-10,-128,-252,-115,-112,-71,44,-314,-121,-206,60,294,306,278,268,280,294,245,267,260,254,24,212,245,277,272,295,243,259,276,240,270,36,82,61,1,-4,-15,51,-14,-9,20,-16,5,25,3,6,5,-3,8,-2,-4,2,2,-26,-118,-195,-262,-113,-92,-126,60,-299,-143,-192,-21,-93,-192,-256,-108,-95,-118,58,-303,-141,-190,-1,1,3,3,-3,-2,-4,0,-2,0,0,116,116,116,116,116,116,116,116,116,116,116,116,12.889648823,13.45646438,12.328159645,11.982205531,12.582573136,13.266250028,11.061946903,12.129196384,11.929067927,11.741863905,9.2945767022,10.773966579,12.283813747,12.161044419,13.256639554,10.964961758,11.694058154,12.5380457,11.011447317,12.481508876,3.5950721207,2.6824978012,0.044345898,-0.178838889,-0.674066418,2.3012882702,-0.632111252,-0.408849316,0.9176206098,-0.73964497,1.0960585734,0.1319261214,0.266075388,0.2235486106,-0.134813284,0.3609863953,-0.090301607,-0.181710807,0.091762061,0.0924556213,-5.173396466,-8.575197889,-11.61862528,-5.052198601,-4.13427403,-5.685535726,2.7090482211,-13.58288284,-6.56098736,-8.875739645,-4.077337893,-8.443271768,-11.35254989,-4.82864999,-4.269087314,-5.324549331,2.6187466137,-13.76459365,-6.469225299,-8.783284024 +050,3,7,22,079,Louisiana,Rapides Parish,131613,131592,131742,132019,132022,132337,132229,131821,131838,131272,130404,129800,128567,150,277,3,315,-108,-408,17,-566,-868,-604,-1233,431,1802,1771,1774,1857,1880,1804,1846,1715,1689,1662,292,1282,1377,1497,1357,1489,1398,1502,1560,1490,1533,139,520,394,277,500,391,406,344,155,199,129,19,115,93,139,94,54,67,16,14,57,50,5,-354,-473,-82,-696,-849,-452,-927,-1038,-863,-1410,24,-239,-380,57,-602,-795,-385,-911,-1024,-806,-1360,-13,-4,-11,-19,-6,-4,-4,1,1,3,-2,4501,4501,4501,4500,4499,4500,4501,4494,4498,4500,4502,4501,13.663885108,13.414583341,13.421143218,14.038085015,14.239727324,13.684342275,14.032153852,13.107812715,12.98212172,12.865420119,9.7209215919,10.43019834,11.325508116,10.258309836,11.278167014,10.604606708,11.417277945,11.923141595,11.452552613,11.866840579,3.9429635162,2.9843850008,2.0956351023,3.779775179,2.9615603105,3.0797355675,2.6148759074,1.18467112,1.5295691073,0.99857954,0.8720015469,0.7044360535,1.051600286,0.7105977336,0.4090134444,0.5082322242,0.1216221352,0.1070025528,0.4381177845,0.3870463333,-2.68424824,-3.582776917,-0.620368514,-5.261447049,-6.430600265,-3.428671124,-7.04648246,-7.933474984,-6.633256983,-10.9147066,-1.812246693,-2.878340864,0.4312317719,-4.550849315,-6.021586821,-2.9204389,-6.924860325,-7.826472432,-6.195139198,-10.52766027 +050,3,7,22,081,Louisiana,Red River Parish,9091,9091,9099,9082,9071,8956,8758,8710,8618,8523,8496,8380,8286,8,-17,-11,-115,-198,-48,-92,-95,-27,-116,-94,20,145,134,131,117,121,105,99,111,95,98,5,103,93,120,102,121,113,100,113,117,145,15,42,41,11,15,0,-8,-1,-2,-22,-47,0,1,5,7,7,11,10,9,9,13,10,-6,-61,-56,-134,-226,-57,-93,-102,-35,-106,-56,-6,-60,-51,-127,-219,-46,-83,-93,-26,-93,-46,-1,1,-1,1,6,-2,-1,-1,1,-1,-1,164,164,164,164,164,164,164,164,164,164,164,164,15.950717782,14.763399989,14.533754923,13.209890482,13.853904282,12.119113573,11.551251386,13.044244668,11.258592083,11.760470419,11.330509873,10.246240291,13.313363288,11.516314779,13.853904282,13.042474608,11.667930692,13.279276103,13.865844987,17.400696028,4.6202079094,4.5171596981,1.2203916348,1.6935757028,0,-0.923361034,-0.116679307,-0.235031435,-2.607252904,-5.640225609,0.1100049502,0.5508731339,0.7766128585,0.790335328,1.2594458438,1.1542012927,1.0501137623,1.0576414595,1.540649443,1.2000480019,-6.710301964,-6.1697791,-14.86658901,-25.51654059,-6.526219373,-10.73407202,-11.90128931,-4.11305012,-12.56221854,-6.720268811,-6.600297013,-5.618905966,-14.08997615,-24.72620526,-5.266773529,-9.579870729,-10.85117554,-3.055408661,-11.02156909,-5.520220809 +050,3,7,22,083,Louisiana,Richland Parish,20725,20722,20757,20887,20917,20918,20763,20552,20458,20421,20215,20147,20014,35,130,30,1,-155,-211,-94,-37,-206,-68,-133,63,266,280,307,297,244,259,244,272,290,274,23,268,240,246,206,235,223,229,255,251,266,40,-2,40,61,91,9,36,15,17,39,8,0,2,4,0,0,0,0,0,0,0,0,-2,130,-11,-56,-249,-222,-128,-50,-225,-106,-142,-2,132,-7,-56,-249,-222,-128,-50,-225,-106,-142,-3,0,-3,-4,3,2,-2,-2,2,-1,1,1039,1039,1039,1039,1039,1039,1039,1039,1037,1037,1037,1037,12.774949573,13.395847287,14.676706107,14.251097622,11.811690669,12.631065594,11.937669708,13.387144404,14.369951935,13.645078559,12.871001825,11.482154818,11.76048763,9.8845996977,11.376013554,10.875396245,11.20379657,12.550447879,12.437441158,13.246682105,-0.096052252,1.9136924696,2.9162184774,4.3664979247,0.4356771148,1.7556693489,0.7338731378,0.8366965252,1.9325107775,0.3983964543,0.0960522524,0.191369247,0,0,0,0,0,0,0,0,6.2433964076,-0.526265429,-2.677184176,-11.94788993,-10.74670217,-6.242379907,-2.446243793,-11.0739246,-5.25246519,-7.071537063,6.3394486601,-0.334896182,-2.677184176,-11.94788993,-10.74670217,-6.242379907,-2.446243793,-11.0739246,-5.25246519,-7.071537063 +050,3,7,22,085,Louisiana,Sabine Parish,24233,24229,24230,24426,24328,24264,24118,24213,24054,23913,23909,23895,23803,1,196,-98,-64,-146,95,-159,-141,-4,-14,-92,67,297,323,310,290,285,278,292,282,263,269,44,274,276,322,276,286,266,314,282,233,257,23,23,47,-12,14,-1,12,-22,0,30,12,0,0,0,14,6,4,4,0,-1,0,0,-19,171,-143,-62,-167,95,-174,-118,-2,-42,-105,-19,171,-143,-48,-161,99,-170,-118,-3,-42,-105,-3,2,-2,-4,1,-3,-1,-1,-1,-2,1,440,440,440,440,440,439,438,438,438,438,438,438,12.208155212,13.250194856,12.759301943,11.987929395,11.793672798,11.519257464,12.175037005,11.793735101,11.003263325,11.279298922,11.262742519,11.322147926,13.253210405,11.409201769,11.835054106,11.022023329,13.092334313,11.793735101,9.7481382311,10.776133171,0.9454126932,1.9280469295,-0.493908462,0.578727626,-0.041381308,0.4972341351,-0.917297309,0,1.2551250941,0.5031657512,0,0,0.5762265393,0.2480261254,0.1655252323,0.1657447117,0,-0.041821756,0,0,7.0289378494,-5.866185339,-2.551860389,-6.903393824,3.931224266,-7.209894959,-4.9200492,-0.083643511,-1.757175132,-4.402700323,7.0289378494,-5.866185339,-1.975633849,-6.655367699,4.0967494983,-7.044150248,-4.9200492,-0.125465267,-1.757175132,-4.402700323 +050,3,7,22,087,Louisiana,St. Bernard Parish,35897,35897,36821,39520,41495,43446,44451,45436,45789,46120,46724,47192,47647,924,2699,1975,1951,1005,985,353,331,604,468,455,143,613,625,649,672,652,658,628,613,579,556,41,268,344,309,327,344,363,389,395,392,438,102,345,281,340,345,308,295,239,218,187,118,6,26,14,52,63,73,73,49,48,73,61,749,2309,1621,1520,588,601,-13,44,337,205,274,755,2335,1635,1572,651,674,60,93,385,278,335,67,19,59,39,9,3,-2,-1,1,3,2,293,293,293,293,293,293,293,293,293,293,293,293,16.059522406,15.429241498,15.281195183,15.290624253,14.507103363,14.425870101,13.665691064,13.204945931,12.330167384,11.725134175,7.0211288823,8.4922545208,7.2756383843,7.4405269804,7.6540545351,7.958344752,8.464894624,8.5088966438,8.3478853444,9.2367064182,9.0383935238,6.9369869777,8.0055567982,7.8500972729,6.853048828,6.4675253494,5.20079644,4.696049287,3.9822820393,2.4884277565,0.6811542945,0.3456150096,1.224379275,1.4334960238,1.6242615729,1.6004384763,1.0662720735,1.0339925036,1.5545806891,1.2863906199,60.491741004,40.01728075,35.789548039,13.379296222,13.372345278,-0.285009592,0.9574688007,7.2594890354,4.3656033051,5.7782136041,61.172895299,40.36289576,37.013927314,14.812792245,14.996606851,1.3154288846,2.0237408741,8.2934815389,5.9201839942,7.064604224 +050,3,7,22,089,Louisiana,St. Charles Parish,52780,52888,52817,52394,52429,52623,52690,52587,52809,52629,52774,53083,52987,-71,-423,35,194,67,-103,222,-180,145,309,-96,150,605,600,679,672,658,670,625,601,575,576,142,411,349,389,444,425,399,425,432,450,494,8,194,251,290,228,233,271,200,169,125,82,5,68,37,58,35,38,38,23,30,44,36,-91,-689,-261,-150,-194,-378,-85,-407,-54,140,-216,-86,-621,-224,-92,-159,-340,-47,-384,-24,184,-180,7,4,8,-4,-2,4,-2,4,0,0,2,592,592,592,592,592,592,592,592,592,592,592,592,11.500698596,11.447869265,12.926931424,12.761957213,12.500356203,12.713954989,11.855308333,11.403849985,10.863712367,10.860752333,7.8128712777,6.658843956,7.4058561474,8.4320074445,8.0739382771,7.5714448366,8.0616096663,8.1971101392,8.5020357652,9.3146035637,3.6878273184,4.7890253093,5.521075277,4.3299497688,4.426417926,5.1425101522,3.7936986665,3.2067398461,2.3616766015,1.5461487697,1.2926405034,0.705951938,1.1042150554,0.6646852715,0.7219050695,0.7210899844,0.4362753466,0.5692437597,0.8313101637,0.6787970208,-13.09748981,-4.97982313,-2.855728592,-3.684255505,-7.181055691,-1.612964439,-7.720176786,-1.024638767,2.6450777936,-4.072782125,-11.8048493,-4.273871192,-1.751513536,-3.019570233,-6.459150622,-0.891874454,-7.28390144,-0.455395008,3.4763879573,-3.393985104 +050,3,7,22,091,Louisiana,St. Helena Parish,11203,11213,11206,10967,10988,10781,10527,10465,10402,10333,10174,10145,10081,-7,-239,21,-207,-254,-62,-63,-69,-159,-29,-64,24,120,115,115,111,118,120,117,119,107,115,9,139,100,142,120,122,127,137,131,80,109,15,-19,15,-27,-9,-4,-7,-20,-12,27,6,0,-1,0,4,8,3,0,-1,-1,-1,-1,-21,-221,5,-188,-259,-60,-56,-47,-146,-55,-68,-21,-222,5,-184,-251,-57,-56,-48,-147,-56,-69,-1,2,1,4,6,-1,0,-1,0,0,-1,121,121,121,121,121,121,121,121,121,121,121,121,10.823975105,10.475973582,10.565483026,10.418622114,11.242378049,11.501413715,11.285266458,11.605793144,10.532014371,11.371502027,12.537771163,9.1095422455,13.046074693,11.263375258,11.62347561,12.172329516,13.214371835,12.776125226,7.8744032679,10.778206269,-1.713796058,1.3664313368,-2.480591667,-0.844753144,-0.381097561,-0.6709158,-1.929105377,-1.170332082,2.6576111029,0.5932957579,-0.090199793,0,0.3674950618,0.7508916839,0.2858231707,0,-0.096455269,-0.097527673,-0.098430041,-0.098882626,-19.93415415,0.4554771123,-17.2722679,-24.31011827,-5.716463415,-5.367326401,-4.533397637,-14.23904033,-5.413652247,-6.72401859,-20.02435394,0.4554771123,-16.90477284,-23.55922658,-5.430640244,-5.367326401,-4.629852906,-14.336568,-5.512082288,-6.822901216 +050,3,7,22,093,Louisiana,St. James Parish,22102,22105,22051,21787,21638,21609,21518,21483,21428,21377,21131,21045,20727,-54,-264,-149,-29,-91,-35,-55,-51,-246,-86,-318,55,284,293,230,318,269,236,255,264,250,238,18,181,179,208,194,201,213,212,221,219,255,37,103,114,22,124,68,23,43,43,31,-17,3,12,2,1,1,4,8,-2,-2,0,0,-99,-381,-269,-48,-218,-105,-84,-91,-287,-118,-298,-96,-369,-267,-47,-217,-101,-76,-93,-289,-118,-298,5,2,4,-4,2,-2,-2,-1,0,1,-3,204,204,204,204,204,204,204,204,204,204,204,204,12.956795474,13.4945308,10.636575947,14.747142162,12.511336946,10.999510615,11.91449597,12.421191305,11.85508346,11.395192952,8.2576759889,8.2440990213,9.6191643351,8.9966842117,9.3486197995,9.927524411,9.9053848849,10.398042721,10.385053111,12.209135306,4.6991194854,5.2504317789,1.0174116124,5.7504579498,3.1627171461,1.071986204,2.0091110852,2.0231485838,1.470030349,-0.813942354,0.5474702313,0.0921128382,0.0462459824,0.0463746609,0.1860421851,0.3728647666,-0.093447027,-0.094099934,0,0,-17.38217984,-12.38917674,-2.219807154,-10.10967607,-4.883607358,-3.915080049,-4.251839738,-13.50334055,-5.595599393,-14.26793067,-16.83470961,-12.2970639,-2.173561172,-10.06330141,-4.697565173,-3.542215283,-4.345286766,-13.59744048,-5.595599393,-14.26793067 +050,3,7,22,095,Louisiana,St. John the Baptist Parish,45924,45810,45588,45065,44716,43565,43712,43527,43441,43356,43140,42824,42516,-222,-523,-349,-1151,147,-185,-86,-85,-216,-316,-308,110,634,628,556,574,581,586,555,511,505,493,128,417,370,406,367,400,403,409,447,431,449,-18,217,258,150,207,181,183,146,64,74,44,4,91,32,94,60,52,58,23,31,29,27,-222,-836,-658,-1428,-117,-420,-329,-256,-312,-419,-380,-218,-745,-626,-1334,-57,-368,-271,-233,-281,-390,-353,14,5,19,33,-3,2,2,2,1,0,1,471,471,471,471,471,471,471,471,471,471,471,471,13.987402513,13.989596908,12.596141865,13.153522692,13.319730854,13.476221139,12.788460431,11.815575287,11.749104276,11.553784861,9.1999161638,8.2422784331,9.1979021534,8.4100049268,9.170210571,9.2677766535,9.4242888579,10.335738069,10.027453353,10.522615421,4.787486349,5.747318475,3.3982397118,4.7435177653,4.1495202834,4.2084444853,3.3641715728,1.4798372179,1.7216509236,1.0311694399,2.0076555657,0.7128457023,2.1295635527,1.3749326856,1.1921273742,1.3338239352,0.5299722341,0.7167961524,0.6747010376,0.6327630654,-18.44395663,-14.65788975,-32.35124206,-2.681118737,-9.6287211,-7.566001288,-5.898821388,-7.214206437,-9.748266716,-8.905554254,-16.43630106,-13.94504405,-30.2216785,-1.306186051,-8.436593725,-6.232177353,-5.368849154,-6.497410285,-9.073565679,-8.272791188 +050,3,7,22,097,Louisiana,St. Landry Parish,83384,83400,83503,83458,83487,83448,83720,83693,83885,83582,82827,82196,81440,103,-45,29,-39,272,-27,192,-303,-755,-631,-756,302,1344,1248,1289,1325,1275,1411,1218,1179,1134,1119,190,880,901,941,948,1002,982,1017,1050,1034,1083,112,464,347,348,377,273,429,201,129,100,36,0,6,-4,8,3,6,15,9,14,18,15,0,-514,-305,-389,-98,-298,-249,-513,-897,-749,-804,0,-508,-309,-381,-95,-292,-234,-504,-883,-731,-789,-9,-1,-9,-6,-10,-8,-3,0,-1,0,-3,1105,1105,1105,1105,1105,1105,1105,1105,1105,1105,1105,1105,16.099568163,14.951031777,15.44313655,15.852316233,15.231792035,16.839919321,14.546149391,14.169906676,13.743538779,13.676697059,10.541383916,10.793974063,11.273849103,11.341883614,11.970396564,11.719915502,12.145676462,12.619509762,12.531586506,13.236696082,5.5581842466,4.1570577136,4.1692874472,4.5104326187,3.2613954711,5.1200038191,2.400472929,1.5503969136,1.2119522733,0.4400009778,0.0718730722,-0.047919974,0.0958456884,0.0358920368,0.0716790213,0.1790211126,0.1074838625,0.1682601302,0.2181514092,0.1833337407,-6.157126515,-3.65389799,-4.6604966,-1.172473201,-3.56005806,-2.971750468,-6.126580162,-10.78066691,-9.077522527,-9.826688504,-6.085253442,-3.701817964,-4.564650912,-1.136581164,-3.488379039,-2.792729356,-6.0190963,-10.61240678,-8.859371118,-9.643354763 +050,3,7,22,099,Louisiana,St. Martin Parish,52160,52160,52263,52804,52664,52950,53309,53891,53829,54125,53629,53497,52954,103,541,-140,286,359,582,-62,296,-496,-132,-543,158,692,710,747,746,781,745,717,702,657,649,60,424,416,463,499,474,492,505,532,536,584,98,268,294,284,247,307,253,212,170,121,65,3,49,26,88,44,38,56,11,10,41,31,7,224,-462,-77,73,240,-372,78,-677,-294,-636,10,273,-436,11,117,278,-316,89,-667,-253,-605,-5,0,2,-9,-5,-3,1,-5,1,0,-3,701,701,701,701,701,701,701,701,701,701,701,701,13.172547041,13.463799446,14.145851876,14.041163572,14.570895522,13.832157445,13.283435537,13.029678713,12.26592984,12.193403538,8.0710403838,7.8886486896,8.7677769993,9.3921456065,8.8432835821,9.1347939101,9.3558367453,9.8743434118,10.006907753,10.972184385,5.1015066577,5.5751507566,5.3780748764,4.6490179655,5.7276119403,4.6973635351,3.9275987921,3.1553353008,2.2590220861,1.2212191525,0.9327381576,0.4930405431,1.6664457364,0.8281651437,0.7089552239,1.0397326402,0.2037905034,0.1856079589,0.7654537647,0.5824275958,4.2639458631,-8.760951189,-1.458140019,1.3740012611,4.4776119403,-6.906795395,1.4450599329,-12.56565882,-5.488863581,-11.94915971,5.1966840207,-8.267910646,0.208305717,2.2021664047,5.1865671642,-5.867062755,1.6488504363,-12.38005086,-4.723409816,-11.36673211 +050,3,7,22,101,Louisiana,St. Mary Parish,54650,54647,54553,54199,53583,53608,53302,52908,52064,50673,49739,49294,48330,-94,-354,-616,25,-306,-394,-844,-1391,-934,-445,-964,192,720,740,758,812,805,750,710,659,624,602,155,553,518,596,524,553,573,553,605,542,595,37,167,222,162,288,252,177,157,54,82,7,7,106,53,93,73,68,47,16,19,34,26,-142,-630,-919,-227,-680,-720,-1073,-1573,-1009,-562,-991,-135,-524,-866,-134,-607,-652,-1026,-1557,-990,-528,-965,4,3,28,-3,13,6,5,9,2,1,-6,868,868,868,868,868,868,868,868,868,868,868,868,13.241135795,13.731420831,14.142978422,15.190347021,15.158647962,14.289524826,13.821700069,13.125921205,12.601859986,12.333032861,10.169927909,9.6119945817,11.120336595,9.8026377327,10.413332078,10.917196967,10.765352307,12.050352548,10.945846334,12.189625502,3.0712078858,4.1194262493,3.0226418263,5.3877092882,4.7453158836,3.3723278589,3.0563477618,1.0755686571,1.656013652,0.1434073588,1.9493894365,0.9834666271,1.7352203077,1.365634646,1.2804820638,0.8954768891,0.3114749311,0.3784408238,0.6866398069,0.5326559043,-11.58599382,-17.05294019,-4.235430213,-12.72098026,-13.55804538,-20.44354685,-30.62187917,-20.09719954,-11.3497521,-20.30238466,-9.636604384,-16.06947357,-2.500209906,-11.35534562,-12.27756332,-19.54806996,-30.31040424,-19.71875871,-10.6631123,-19.76972876 +050,3,7,22,103,Louisiana,St. Tammany Parish,233740,233760,234564,236900,239154,242074,245390,249116,252676,256212,258598,261303,263446,804,2336,2254,2920,3316,3726,3560,3536,2386,2705,2143,649,2706,2675,2687,2990,2953,3018,3002,2888,2944,2892,453,1909,1948,2120,2104,2166,2118,2176,2374,2462,2656,196,797,727,567,886,787,900,826,514,482,236,37,281,145,203,143,203,282,167,188,263,215,562,1264,1411,2142,2283,2732,2383,2555,1698,1969,1692,599,1545,1556,2345,2426,2935,2665,2722,1886,2232,1907,9,-6,-29,8,4,4,-5,-12,-14,-9,0,1275,1275,1275,1275,1275,1275,1276,1276,1277,1277,1277,1277,11.479137325,11.238220874,11.16726375,12.26757258,11.943232236,12.028888464,11.798273883,11.219673278,11.325233073,11.02241262,8.0981792883,8.1839455188,8.8107923895,8.6324323437,8.7602577117,8.4417447867,8.5519800035,9.2228200695,9.4710339084,10.122934965,3.3809580371,3.0542753553,2.3564713608,3.635140236,3.1829745241,3.5871436771,3.24629388,1.996853208,1.8541991648,0.899477655,1.1920316291,0.6091745894,0.8436749316,0.5867099929,0.821021383,1.1239716855,0.6563330242,0.730366543,1.0117310796,0.8194393891,5.3620212784,5.9278989358,8.9022251407,9.3668455517,11.049410927,9.4979593138,10.041502256,6.5966084575,7.574518995,6.4487974251,6.5540529075,6.5370735253,9.7459000723,9.9535555446,11.87043231,10.621930999,10.69783528,7.3269750005,8.5862500745,7.2682368142 +050,3,7,22,105,Louisiana,Tangipahoa Parish,121097,121083,121463,122694,123656,125550,127058,128774,130759,132445,133951,134845,136765,380,1231,962,1894,1508,1716,1985,1686,1506,894,1920,395,1848,1896,1930,1956,1925,2055,1935,1981,1879,1874,200,1074,1143,1171,1193,1204,1170,1323,1294,1354,1503,195,774,753,759,763,721,885,612,687,525,371,13,140,45,180,92,33,90,32,26,85,63,165,318,189,948,655,957,1009,1041,789,280,1485,178,458,234,1128,747,990,1099,1073,815,365,1548,7,-1,-25,7,-2,5,1,1,4,4,1,3638,3639,3641,3644,3647,3645,3651,3649,3645,3645,3646,3646,15.137800677,15.392733915,15.489193679,15.486445402,15.048938366,15.836136445,14.70342396,14.872595685,13.98086281,13.799197379,8.7976179262,9.279480414,9.3978475639,9.4454649101,9.4124269052,9.0161944724,10.053038708,9.7148605835,10.074554681,11.0673392,6.3401827513,6.1132535011,6.0913461153,6.0409804915,5.6365114606,6.8199419727,4.6503852525,5.1577351011,3.9063081296,2.731858179,1.1468030816,0.3653338746,1.4445880115,0.7284013175,0.2579818006,0.693553421,0.2431573988,0.1951981261,0.6324498876,0.4639004455,2.6048812854,1.5344022732,7.6081635274,5.1859006841,7.4814722161,7.7755044638,7.9102141305,5.9235123651,2.0833643358,10.934796215,3.751684367,1.8997361478,9.0527515389,5.9143020015,7.7394540167,8.4690578847,8.1533715293,6.1187104911,2.7158142234,11.398696661 +050,3,7,22,107,Louisiana,Tensas Parish,5252,5250,5229,5091,4998,4932,4852,4773,4652,4572,4454,4319,4178,-21,-138,-93,-66,-80,-79,-121,-80,-118,-135,-141,12,70,72,54,68,57,53,57,40,45,38,7,58,49,59,61,49,57,68,50,53,67,5,12,23,-5,7,8,-4,-11,-10,-8,-29,0,0,0,0,0,0,0,0,0,0,0,-27,-151,-121,-60,-89,-88,-117,-70,-107,-127,-111,-27,-151,-121,-60,-89,-88,-117,-70,-107,-127,-111,1,1,5,-1,2,1,0,1,-1,0,-1,16,16,16,16,16,16,16,16,16,16,16,16,13.565891473,14.272970562,10.876132931,13.900245298,11.844155844,11.24668435,12.359063313,8.8632838467,10.258748433,8.9443332941,11.240310078,9.7135494102,11.883182276,12.469337694,10.181818182,12.095490716,14.744145707,11.079104808,12.082525932,15.770271861,2.3255813953,4.5594211517,-1.007049345,1.4309076043,1.6623376623,-0.848806366,-2.385082394,-2.215820962,-1.823777499,-6.825938567,0,0,0,0,0,0,0,0,0,0,-29.26356589,-23.98651997,-12.08459215,-18.19296811,-18.28571429,-24.82758621,-15.17779705,-23.70928429,-28.9524678,-26.12686831,-29.26356589,-23.98651997,-12.08459215,-18.19296811,-18.28571429,-24.82758621,-15.17779705,-23.70928429,-28.9524678,-26.12686831 +050,3,7,22,109,Louisiana,Terrebonne Parish,111860,111589,111552,111690,111762,112773,113553,113894,113071,111880,111265,110615,109859,-37,138,72,1011,780,341,-823,-1191,-615,-650,-756,393,1673,1662,1571,1710,1757,1665,1585,1509,1473,1437,234,961,960,1045,1032,1090,961,1036,1099,1133,1207,159,712,702,526,678,667,704,549,410,340,230,11,102,54,161,70,59,115,19,25,55,54,-213,-678,-687,336,59,-378,-1650,-1764,-1054,-1046,-1037,-202,-576,-633,497,129,-319,-1535,-1745,-1029,-991,-983,6,2,3,-12,-27,-7,8,5,4,1,-3,1479,1479,1479,1479,1479,1479,1479,1479,1478,1479,1478,1479,14.988219063,14.875677998,13.993364064,15.110946157,15.449753129,14.671865706,14.091957804,13.52483811,13.277447269,13.035550677,8.6094910456,8.5924493851,9.308125682,9.1195885581,9.58465049,8.4682660322,9.2108948171,9.8500974703,10.212727601,10.94913686,6.3787280171,6.2832286129,4.6852383815,5.9913575992,5.8651026393,6.203599674,4.8810629871,3.6747406395,3.0647196683,2.0864138175,0.9138065418,0.4833252779,1.4340748658,0.6185767433,0.5188021825,1.0133721058,0.1689256771,0.2240695512,0.4957634758,0.4898536789,-6.074125837,-6.148971591,2.9928518939,0.5213718265,-3.323851271,-14.53968674,-15.6834155,-9.446772278,-9.428519921,-9.407004908,-5.160319295,-5.665646313,4.4269267597,1.1399485698,-2.805049088,-13.52631463,-15.51448982,-9.222702727,-8.932756445,-8.917151229 +050,3,7,22,111,Louisiana,Union Parish,22721,22781,22842,22766,22528,22460,22560,22490,22514,22391,22209,22068,22170,61,-76,-238,-68,100,-70,24,-123,-182,-141,102,70,296,303,264,276,277,274,277,241,234,232,39,245,244,261,296,262,267,288,287,258,266,31,51,59,3,-20,15,7,-11,-46,-24,-34,2,21,2,33,13,6,7,-1,-4,17,15,27,-148,-305,-101,107,-90,12,-110,-130,-134,121,29,-127,-303,-68,120,-84,19,-111,-134,-117,136,1,0,6,-3,0,-1,-2,-1,-2,0,0,476,476,476,476,476,476,476,476,476,476,476,476,12.980178916,13.379255531,11.736463057,12.261217237,12.297447281,12.176695405,12.337156219,10.807174888,10.569821804,10.488720105,10.74372917,10.774053959,11.603094158,13.149711239,11.631520533,11.865611946,12.82707939,12.869955157,11.653906091,12.02586012,2.2364497457,2.605201572,0.1333688984,-0.888494003,0.6659267481,0.3110834592,-0.489923171,-2.062780269,-1.084084288,-1.537140015,0.9208910717,0.0883119177,1.4670578821,0.5775211017,0.2663706992,0.3110834592,-0.04453847,-0.179372197,0.767893037,0.6781500068,-6.490089458,-13.46756745,-4.490086245,4.7534429143,-3.995560488,0.5332859301,-4.899231711,-5.829596413,-6.052803939,5.4704100547,-5.569198386,-13.37925553,-3.023028363,5.330964016,-3.729189789,0.8443693894,-4.943770181,-6.00896861,-5.284910902,6.1485600615 +050,3,7,22,113,Louisiana,Vermilion Parish,57999,57958,58083,58198,58637,59286,59539,59928,60120,59937,59928,59573,59378,125,115,439,649,253,389,192,-183,-9,-355,-195,200,759,813,803,770,832,840,737,769,737,732,96,586,513,520,520,592,560,576,591,613,653,104,173,300,283,250,240,280,161,178,124,79,9,52,34,64,38,22,15,3,3,12,15,19,-107,117,306,-22,132,-101,-348,-189,-492,-292,28,-55,151,370,16,154,-86,-345,-186,-480,-277,-7,-3,-12,-4,-13,-5,-2,1,-1,1,3,536,536,536,536,536,536,536,536,536,537,536,537,13.054583294,13.917062524,13.619056503,12.960235641,13.928532565,13.994402239,12.27750152,12.831101656,12.334624815,12.307588839,10.079032688,8.7816150982,8.8193142983,8.7523669262,9.9106866331,9.3296014927,9.595442165,9.8610937304,10.259328374,10.979310809,2.9755506059,5.1354474259,4.7997422047,4.2078687145,4.0178459323,4.6648007464,2.6820593551,2.9700079256,2.075296441,1.3282780304,0.8943851532,0.5820173749,1.0854540675,0.6395960446,0.3683025438,0.24990004,0.0499762613,0.0500563134,0.2008351395,0.2522046893,-1.84036945,2.0028244961,5.1898272602,-0.370292447,2.2098152628,-1.682660269,-5.797246308,-3.153547741,-8.234240718,-4.909584619,-0.945984297,2.584841871,6.2752813276,0.2693035977,2.5781178066,-1.432760229,-5.747270047,-3.103491428,-8.033405578,-4.65737993 +050,3,7,22,115,Louisiana,Vernon Parish,52334,52357,52737,52297,54173,52884,52900,51535,51666,49941,48679,48394,47894,380,-440,1876,-1289,16,-1365,131,-1725,-1262,-285,-500,260,1120,1015,1192,1005,1019,1066,900,934,766,809,100,354,355,375,435,401,396,430,421,413,399,160,766,660,817,570,618,670,470,513,353,410,103,67,524,313,213,312,185,75,30,57,60,104,-1281,660,-2471,-761,-2321,-723,-2281,-1808,-690,-963,207,-1214,1184,-2158,-548,-2009,-538,-2206,-1778,-633,-903,13,8,32,52,-6,26,-1,11,3,-5,-7,2258,2251,2253,2253,2248,3014,3114,3285,2583,2950,3374,3373,21.326427633,19.066403682,22.268511167,19.000983135,19.514530569,20.658714547,17.71531489,18.941391199,15.781937305,16.8037554,6.7406744483,6.6685451301,7.0056138319,8.2243061333,7.6794178197,7.6743442409,8.4639837806,8.5378219428,8.5090601918,8.2876370887,14.585753185,12.397858552,15.262897335,10.776677002,11.83511275,12.984370306,9.2513311091,10.403569256,7.2728771131,8.5161183117,1.2757773673,9.8431483047,5.847352345,4.0270740377,5.9750083784,3.5852365772,1.4762762408,0.6083958629,1.1743739248,1.2462612164,-24.39210161,12.397858552,-46.16232474,-14.38780912,-44.44870015,-14.01149214,-44.8984814,-36.66599067,-14.21610541,-20.00249252,-23.11632424,22.241006856,-40.3149724,-10.36073508,-38.47369177,-10.42625556,-43.42220516,-36.05759481,-13.04173148,-18.75623131 +050,3,7,22,117,Louisiana,Washington Parish,47168,47134,47083,47125,46675,46412,46320,46365,46414,46678,46601,46158,45773,-51,42,-450,-263,-92,45,49,264,-77,-443,-385,127,577,545,531,599,619,643,657,554,526,513,82,551,560,558,588,599,611,581,632,642,682,45,26,-15,-27,11,20,32,76,-78,-116,-169,1,-4,-11,-11,-13,-8,4,-6,-5,5,6,-96,21,-430,-223,-80,38,16,199,8,-331,-223,-95,17,-441,-234,-93,30,20,193,3,-326,-217,-1,-1,6,-2,-10,-5,-3,-5,-2,-1,1,1582,1582,1582,1582,1582,1582,1582,1582,1582,1582,1581,1583,12.249490489,11.620469083,11.408682201,12.91894923,13.357069644,13.860895246,14.115068964,11.878343464,11.341217564,11.160544321,11.69752038,11.940298507,11.988784685,12.681706423,12.925500351,13.171083974,12.482275598,13.550745613,13.842322578,14.837214868,0.5519701087,-0.319829424,-0.580102485,0.2372428072,0.4315692938,0.6898112719,1.6327933657,-1.672402148,-2.501105014,-3.676670546,-0.084918478,-0.234541578,-0.236338049,-0.280377863,-0.172627718,0.086226409,-0.128904739,-0.107205266,0.1078062506,0.1305326821,0.4458220109,-9.168443497,-4.791216819,-1.725402234,0.8199816583,0.344905636,4.2753405234,0.1715284255,-7.13677379,-4.851464685,0.3609035326,-9.402985075,-5.027554868,-2.005780097,0.6473539408,0.431132045,4.146435784,0.0643231596,-7.02896754,-4.720932003 +050,3,7,22,119,Louisiana,Webster Parish,41207,41206,41202,41248,40914,40669,40292,40067,39750,39268,38780,38323,37943,-4,46,-334,-245,-377,-225,-317,-482,-488,-457,-380,105,519,522,498,510,507,511,494,487,433,420,139,492,458,553,573,475,532,562,571,515,581,-34,27,64,-55,-63,32,-21,-68,-84,-82,-161,3,-2,-3,13,8,16,7,4,4,5,5,29,23,-403,-202,-325,-270,-303,-419,-407,-379,-224,32,21,-406,-189,-317,-254,-296,-415,-403,-374,-219,-2,-2,8,-1,3,-3,0,1,-1,-1,0,1231,1231,1231,1231,1231,1231,1231,1231,1231,1231,1231,1231,12.58944815,12.706604026,12.208425775,12.598658613,12.618375042,12.804289813,12.50348022,12.479499795,11.231728986,11.014082291,11.934505761,11.148706215,13.556745891,14.154963501,11.821949004,13.330493504,14.224607052,14.63202132,13.358753875,15.236147169,0.6549423893,1.5578978116,-1.348320116,-1.556304888,0.7964260382,-0.526203691,-1.721126832,-2.152521525,-2.127024889,-4.222064878,-0.048514251,-0.07302646,0.3186938455,0.1976260175,0.3982130191,0.1754012303,0.1012427548,0.102501025,0.1296966396,0.1311200273,0.5579138872,-9.809887783,-4.952012061,-8.02855696,-6.719844697,-7.592367541,-10.60517857,-10.42947929,-9.831005279,-5.874177222,0.5093996361,-9.882914243,-4.633318216,-7.830930942,-6.321631678,-7.41696631,-10.50393581,-10.32697827,-9.701308639,-5.743057195 +050,3,7,22,121,Louisiana,West Baton Rouge Parish,23788,23798,23964,24125,24170,24682,25229,25596,25942,26238,26451,26550,26792,166,161,45,512,547,367,346,296,213,99,242,78,349,312,365,349,396,383,370,362,355,351,13,192,161,216,210,231,208,213,221,195,240,65,157,151,149,139,165,175,157,141,160,111,2,18,2,36,-3,-3,-3,-2,-2,-1,0,93,-13,-107,318,401,205,174,140,75,-60,129,95,5,-105,354,398,202,171,138,73,-61,129,6,-1,-1,9,10,0,0,1,-1,0,2,556,556,556,556,556,556,556,556,556,556,556,556,14.514753894,12.920592194,14.943093425,13.98489311,15.58288244,14.862819667,14.181678804,13.74100856,13.395973661,13.160361441,7.9851941192,6.6673568692,8.8430361091,8.414978662,9.0900147565,8.0717140751,8.1640475278,8.3888477671,7.3583517292,8.9985377376,6.5295597746,6.2532353246,6.100057316,5.5699144477,6.4928676832,6.791105592,6.0176312764,5.3521607926,6.0376219317,4.1618237036,0.7486119487,0.0828243089,1.4738393515,-0.120213981,-0.11805214,-0.116418953,-0.076657723,-0.075917174,-0.037735137,0,-0.540664185,-4.431100528,13.018914272,16.068602112,8.0668962125,6.7522992743,5.3660406286,2.8468940386,-2.264108224,4.836714034,0.2079477635,-4.348276219,14.492753623,15.948388131,7.9488440728,6.6358803213,5.2893829053,2.7709768642,-2.301843361,4.836714034 +050,3,7,22,123,Louisiana,West Carroll Parish,11604,11604,11577,11521,11500,11452,11526,11287,11144,10967,11008,10906,10646,-27,-56,-21,-48,74,-239,-143,-177,41,-102,-260,31,150,133,124,149,146,146,102,119,112,115,46,125,116,159,140,146,139,153,139,142,159,-15,25,17,-35,9,0,7,-51,-20,-30,-44,0,0,0,1,2,8,11,4,3,8,7,-11,-82,-35,-12,65,-247,-161,-131,59,-81,-221,-11,-82,-35,-11,67,-239,-150,-127,62,-73,-214,-1,1,-3,-2,-2,0,0,1,-1,1,-2,434,434,434,434,434,434,434,434,434,434,434,434,12.988137501,11.554667478,10.805158592,12.9689268,12.799719458,13.017698721,9.226177016,10.830489192,10.221776034,10.6718634,10.823447918,10.077755093,13.855001743,12.185568805,12.799719458,12.39356248,13.839265524,12.650739477,12.959751757,14.755011136,2.1646895835,1.4769123843,-3.049843151,0.7833579946,0,0.62413624,-4.613088508,-1.820250284,-2.737975723,-4.083147736,0,0,0.0871383757,0.1740795544,0.7013544909,0.98078552,0.3618108634,0.2730375427,0.7301268595,0.6495916852,-7.100181834,-3.040701968,-1.045660509,5.6575855166,-21.65431991,-14.35513352,-11.84930578,5.369738339,-7.392534453,-20.50853749,-7.100181834,-3.040701968,-0.958522133,5.8316650709,-20.95296541,-13.374348,-11.48749491,5.6427758817,-6.662407593,-19.85894581 +050,3,7,22,125,Louisiana,West Feliciana Parish,15625,15620,15636,15511,15471,15455,15372,15376,15322,15373,15474,15570,15465,16,-125,-40,-16,-83,4,-54,51,101,96,-105,30,126,137,107,138,113,110,113,145,115,124,11,117,109,118,131,120,142,139,158,111,136,19,9,28,-11,7,-7,-32,-26,-13,4,-12,4,13,1,3,-1,8,14,12,13,19,16,-6,-149,-69,-7,-89,3,-36,66,101,74,-108,-2,-136,-68,-4,-90,11,-22,78,114,93,-92,-1,2,0,-1,0,0,0,-1,0,-1,-1,5297,5297,5297,5301,5305,5319,5327,5316,5316,5319,5332,5320,8.0906668379,8.8438448131,6.9197439048,8.9531903851,7.3500715494,7.1665906574,7.3627626649,9.40123837,7.4088390671,7.9909779281,7.5127620638,7.0363436834,7.6311194464,8.4990430467,7.8053857161,9.2514170304,9.0568496498,10.244108017,7.151140317,8.7642983728,0.5779047741,1.8075011297,-0.711375542,0.4541473384,-0.455314167,-2.084826373,-1.694086985,-0.842869647,0.2576987502,-0.773320445,0.8347513404,0.0645536118,0.1940115113,-0.064878191,0.5203590477,0.9121115382,0.7818863007,0.842869647,1.2240690633,1.0310939262,-9.567534594,-4.454199212,-0.452693526,-5.774159016,0.1951346429,-2.34542967,4.3003746539,6.5484487957,4.767426878,-6.959884002,-8.732783254,-4.389645601,-0.258682015,-5.839037208,0.7154936906,-1.433318131,5.0822609546,7.3913184426,5.9914959412,-5.928790076 +050,3,7,22,127,Louisiana,Winn Parish,15313,15313,15302,15155,15105,14852,14823,14646,14539,14355,14132,13961,13839,-11,-147,-50,-253,-29,-177,-107,-184,-223,-171,-122,43,190,173,165,160,166,177,166,145,162,141,21,151,143,194,165,170,183,158,187,189,224,22,39,30,-29,-5,-4,-6,8,-42,-27,-83,0,1,-3,0,-2,-3,-2,-2,-2,-2,-2,-35,-188,-76,-227,-20,-171,-99,-189,-179,-141,-37,-35,-187,-79,-227,-22,-174,-101,-191,-181,-143,-39,2,1,-1,3,-2,1,0,-1,0,-1,0,1760,1760,1760,1760,1760,1760,1760,1760,1762,1762,1765,1765,12.476606363,11.434236616,11.015789298,10.783487784,11.266076216,12.129518588,11.490274798,10.180082143,11.53312213,10.143884892,9.9156187412,9.4514210178,12.95189772,11.120471778,11.537547932,12.54068871,10.936526615,13.128795591,13.455309152,16.115107914,2.5609876219,1.9828155981,-1.936108422,-0.336983993,-0.271471716,-0.411170122,0.553748183,-2.948713448,-1.922187022,-5.971223022,0.0656663493,-0.19828156,0,-0.134793597,-0.203603787,-0.137056707,-0.138437046,-0.140414926,-0.142384224,-0.143884892,-12.34527366,-5.023132849,-15.15505558,-1.347935973,-11.60541586,-6.784307007,-13.08230082,-12.56713589,-10.03808778,-2.661870504,-12.27960732,-5.221414408,-15.15505558,-1.48272957,-11.80901965,-6.921363714,-13.22073787,-12.70755081,-10.180472,-2.805755396 +040,1,1,23,000,Maine,Maine,1328361,1328354,1327651,1328473,1328094,1328543,1331217,1329098,1332348,1335743,1340123,1345770,1350141,-703,822,-379,449,2674,-2119,3250,3395,4380,5647,4371,3448,12628,12796,12866,12705,12644,12704,12396,12265,12390,12209,3102,13024,12753,13405,13348,14174,14173,14552,14577,14692,15562,346,-396,43,-539,-643,-1530,-1469,-2156,-2312,-2302,-3353,322,1265,656,1910,3172,770,2118,774,1024,2057,1605,-1312,-5,-874,-780,310,-1267,2657,4829,5701,5899,6114,-990,1260,-218,1130,3482,-497,4775,5603,6725,7956,7719,-59,-42,-204,-142,-165,-92,-56,-52,-33,-7,5,35545,35544,35531,35598,35689,35839,35660,36436,35869,37006,36203,36221,9.5085922193,9.6334856226,9.6859299934,9.5534935483,9.5056412493,9.5466900324,9.2920368908,9.1671257081,9.2259818243,9.0574206641,9.8067710694,9.6011130154,10.091706168,10.036995819,10.655880977,10.650601215,10.908173672,10.895164407,10.94012308,11.544891504,-0.29817885,0.0323726072,-0.405776175,-0.483502271,-1.150239727,-1.103911182,-1.616136781,-1.728038698,-1.714141256,-2.48747084,0.9525157711,0.4938704727,1.4379081523,2.38517761,0.578878817,1.5916159862,0.580190106,0.7653597004,1.531706587,1.190692126,-0.003764884,-0.657992063,-0.587208565,0.2331037387,-0.952518781,1.9966589591,3.6198165655,4.2610504412,4.3925800469,4.5357580425,0.9487508866,-0.16412159,0.8506995875,2.6182813487,-0.373639964,3.5882749453,4.2000066714,5.0264101416,5.9242866339,5.7264501684 +050,1,1,23,001,Maine,Androscoggin County,107702,107713,107712,107458,107517,107267,107411,107189,107389,107507,107987,108361,108547,-1,-254,59,-250,144,-222,200,118,480,374,186,370,1340,1317,1287,1258,1266,1264,1254,1204,1255,1211,251,1015,1021,1051,1010,1120,1145,1164,1164,1145,1176,119,325,296,236,248,146,119,90,40,110,35,39,115,55,179,277,107,190,103,132,211,158,-156,-694,-280,-665,-369,-469,-106,-68,309,52,-10,-117,-579,-225,-486,-92,-362,84,35,441,263,148,-3,0,-12,0,-12,-6,-3,-7,-1,1,3,2760,2760,2760,2760,2716,2720,2785,2906,2817,3274,3167,3165,12.455267928,12.25258751,11.984132896,11.719878143,11.798695247,11.78126369,11.670761671,11.174325039,11.601678777,11.166024305,9.4344007064,9.4987789278,9.7865762813,9.4094411165,10.438024231,10.672109909,10.833147197,10.803085005,10.584798565,10.84330684,3.0208672213,2.7538085824,2.197556615,2.3104370266,1.3606710158,1.1091537809,0.837614474,0.3712400345,1.0168802115,0.3227174655,1.0689222475,0.5116874055,1.6667908224,2.5806090983,0.9972041007,1.7709178015,0.9586032313,1.2250921139,1.950561133,1.4568388441,-6.450713389,-2.604954064,-6.19226758,-3.437706705,-4.370922647,-0.987985721,-0.632864269,2.8678292667,0.4807070091,-0.09220499,-5.381791142,-2.093266659,-4.525476758,-0.857097607,-3.373718546,0.7829320806,0.3257389621,4.0929213806,2.4312681421,1.364633854 +050,1,1,23,003,Maine,Aroostook County,71870,71873,71699,71394,70786,70100,69565,68869,68319,67638,67302,67092,66804,-174,-305,-608,-686,-535,-696,-550,-681,-336,-210,-288,157,655,645,688,694,652,709,599,638,629,613,212,854,857,850,796,909,894,887,860,873,942,-55,-199,-212,-162,-102,-257,-185,-288,-222,-244,-329,6,38,4,37,85,38,77,25,38,69,55,-124,-142,-400,-569,-519,-478,-440,-418,-149,-33,-16,-118,-104,-396,-532,-434,-440,-363,-393,-111,36,39,-1,-2,0,8,1,1,-2,0,-3,-2,2,2005,2004,2003,2004,2001,2008,2033,2118,2033,2186,2190,2192,9.1548852844,9.0730060487,9.766761779,9.9380660867,9.4196512417,10.336181007,8.811609553,9.4560545428,9.3605369287,9.1563601601,11.93629318,12.05514137,12.066493477,11.398704042,13.132611931,13.033209902,13.048243195,12.74640581,12.991651413,14.070621975,-2.781407896,-2.982135321,-2.299731698,-1.460637955,-3.712960689,-2.697028895,-4.236633642,-3.290351267,-3.631114484,-4.914261815,0.5311231157,0.0562667042,0.5252473631,1.2171982959,0.5489980785,1.1225471616,0.3677633369,0.56321328,1.026831555,0.8215331302,-1.984723222,-5.626670418,-8.077452692,-7.432069595,-6.905817935,-6.414555209,-6.149002994,-2.208388914,-0.491093352,-0.238991456,-1.453600106,-5.570403714,-7.552205329,-6.214871299,-6.356819856,-5.292008047,-5.781239657,-1.645175634,0.5357382026,0.5825416741 +050,1,1,23,005,Maine,Cumberland County,281674,281687,281481,282753,283742,285681,288274,289704,291522,292549,294363,296052,298111,-206,1272,989,1939,2593,1430,1818,1027,1814,1689,2059,743,2715,2697,2892,2825,2768,2831,2717,2753,2729,2737,578,2455,2412,2589,2533,2641,2678,2696,2683,2806,2958,165,260,285,303,292,127,153,21,70,-77,-221,165,637,357,847,1487,405,1055,434,559,948,740,-545,385,410,824,850,921,622,584,1189,811,1531,-380,1022,767,1671,2337,1326,1677,1018,1748,1759,2271,9,-10,-63,-35,-36,-23,-12,-12,-4,7,9,9190,9190,9184,9187,9178,9200,9238,9236,9176,9426,9324,9327,9.6236667766,9.5217080468,10.157650815,9.8439773153,9.5782192402,9.7414774976,9.3036634245,9.3813041819,9.2443450793,9.21296008,8.7020633283,8.5155208784,9.0934156155,8.8264759432,9.1387561464,9.2150041464,9.2317543586,9.1427675699,9.5051785608,9.9568636889,0.9216034482,1.0061871685,1.0642351995,1.0175013721,0.4394630938,0.5264733512,0.0719090658,0.238536612,-0.260833482,-0.743903609,2.2579284481,1.2603818216,2.9749413002,5.1815908913,1.401437425,3.6302574214,1.4861206942,1.9048852298,3.2113005259,2.4908989621,1.3646820291,1.4474973301,2.8941577702,2.9619046789,3.1869725145,2.1403034276,1.9997568789,4.0517147375,2.7472201756,5.1534679877,3.6226104772,2.7078791516,5.8690990705,8.1434955702,4.5884099395,5.770560849,3.4858775731,5.9565999673,5.9585207015,7.6443669498 +050,1,1,23,007,Maine,Franklin County,30768,30767,30719,30740,30648,30476,30206,30024,29995,29808,29831,30046,29986,-48,21,-92,-172,-270,-182,-29,-187,23,215,-60,75,239,292,245,267,259,252,234,222,248,232,81,301,313,283,316,331,314,367,358,358,364,-6,-62,-21,-38,-49,-72,-62,-133,-136,-110,-132,12,35,15,27,22,-3,6,-1,0,3,5,-53,48,-80,-164,-244,-103,29,-52,159,322,67,-41,83,-65,-137,-222,-106,35,-53,159,325,72,-1,0,-6,3,1,-4,-2,-1,0,0,0,1110,1110,1110,1110,1041,1001,1074,1063,1036,1104,1021,1024,7.7775427521,9.5132599205,8.0164910673,8.799973633,8.6003652665,8.3973408421,7.8256943632,7.4447928369,8.2836481454,7.7292110874,9.7951479848,10.197432723,9.2598651921,10.414950068,10.991200398,10.463353271,12.273631758,12.005566827,11.95784692,12.126865672,-2.017605233,-0.684172803,-1.243374125,-1.614976435,-2.390835132,-2.066012429,-4.447937394,-4.56077399,-3.674198774,-4.397654584,1.1389706959,0.4886948589,0.883450036,0.7250914604,-0.09961813,0.1999366867,-0.033443138,0,0.1002054211,0.1665778252,1.5620169544,-2.606372581,-5.366140959,-8.04192347,-3.42022248,0.9663606525,-1.739043192,5.3320813562,10.755381866,2.2321428571,2.7009876503,-2.117677722,-4.482690923,-7.316832009,-3.519840611,1.1662973392,-1.77248633,5.3320813562,10.855587287,2.3987206823 +050,1,1,23,009,Maine,Hancock County,54418,54407,54351,54533,54494,54589,54512,54280,54540,54584,54849,55098,55088,-56,182,-39,95,-77,-232,260,44,265,249,-10,132,453,445,488,476,481,453,459,451,428,418,136,529,539,572,600,607,574,637,622,649,715,-4,-76,-94,-84,-124,-126,-121,-178,-171,-221,-297,25,77,56,84,112,50,98,29,36,69,56,-76,182,14,103,-51,-153,287,196,400,402,232,-51,259,70,187,61,-103,385,225,436,471,288,-1,-1,-15,-8,-14,-3,-4,-3,0,-1,-1,1176,1176,1176,1176,1002,996,822,951,951,956,924,927,8.3207817494,8.1631155585,8.947315347,8.7258595247,8.8425619531,8.3256754273,8.412448224,8.2424862701,7.7855694107,7.5871707839,9.7167627934,9.8874590698,10.487427005,10.998982594,11.158908743,10.549531336,11.67479198,11.367686164,11.805688195,12.978055288,-1.395981044,-1.724343511,-1.540111658,-2.273123069,-2.31634679,-2.223855909,-3.262343756,-3.125199894,-4.020118785,-5.390884504,1.4143492157,1.0272684748,1.5401116581,2.0531434176,0.9191852342,1.8011394964,0.5315054433,0.6579368198,1.2551502087,1.0164630715,3.3430072371,0.2568171187,1.8884702474,-0.93491352,-2.812706817,5.2747656681,3.5922436861,7.3104091088,7.3126142596,4.2110612964,4.7573564527,1.2840855935,3.4285819055,1.1182298971,-1.893521582,7.0759051645,4.1237491294,7.9683459286,8.5677644683,5.2275243679 +050,1,1,23,011,Maine,Kennebec County,122151,122151,122074,121801,121610,121167,121277,121063,121538,121970,122086,122241,122955,-77,-273,-191,-443,110,-214,475,432,116,155,714,311,1193,1203,1201,1127,1246,1195,1123,1151,1156,1141,354,1286,1191,1293,1339,1335,1333,1315,1367,1385,1503,-43,-93,12,-92,-212,-89,-138,-192,-216,-229,-362,9,35,23,88,205,29,89,31,40,84,72,-30,-212,-216,-430,143,-138,528,602,298,299,1007,-21,-177,-193,-342,348,-109,617,633,338,383,1079,-13,-3,-10,-9,-26,-16,-4,-9,-6,1,-3,3636,3635,3635,3640,3659,3696,3597,3714,3797,3863,3745,3749,9.7837006663,9.8845163119,9.8938532069,9.2969922951,10.283073368,9.8515669762,9.2235162705,9.4322614482,9.462728229,9.3068402421,10.546386468,9.7859176455,10.651750372,11.045849763,11.017578609,10.989237472,10.800466514,11.202347002,11.337265222,12.259580091,-0.762685802,0.0985986665,-0.757897165,-1.748857468,-0.734505241,-1.137670496,-1.576950244,-1.770085554,-1.874536993,-2.952739849,0.2870322911,0.1889807774,0.7249451142,1.6911121744,0.2393331683,0.73371503,0.2546117581,0.3277936211,0.6876030893,0.5872852738,-1.738595592,-1.774775996,-3.542345445,1.1796538582,-1.138895766,4.3528262456,4.9443960773,2.4420624775,2.4475395679,8.2138370936,-1.451563301,-1.585795219,-2.81740033,2.8707660326,-0.899562598,5.0865412756,5.1990078355,2.7698560986,3.1351426572,8.8011223674 +050,1,1,23,013,Maine,Knox County,39736,39732,39727,39674,39613,39693,39897,39797,39769,39774,39760,39792,39951,-5,-53,-61,80,204,-100,-28,5,-14,32,159,96,332,352,361,362,351,333,322,302,320,305,75,442,393,468,423,489,526,505,471,492,481,21,-110,-41,-107,-61,-138,-193,-183,-169,-172,-176,2,14,14,104,129,9,14,9,10,21,17,-26,46,-28,91,143,33,153,183,146,185,319,-24,60,-14,195,272,42,167,192,156,206,336,-2,-3,-6,-8,-7,-4,-2,-4,-1,-2,-1,1361,1361,1361,1361,1360,1365,1316,1400,1372,1478,1415,1414,8.3626150804,8.8791352933,9.1039770005,9.0966201784,8.8086932517,8.3704094714,8.0962498271,7.5942364272,8.0450522928,7.6495742573,11.133361041,9.9133527564,11.802385696,10.629476065,12.271940171,13.221727874,12.697534667,11.843991249,12.3692679,12.063754812,-2.77074596,-1.034217463,-2.698408695,-1.532855886,-3.463246919,-4.851318402,-4.60128484,-4.249754822,-4.324215607,-4.414180555,0.352640395,0.3531474264,2.6227523769,3.241613268,0.2258639295,0.3519091069,0.226292697,0.2514647824,0.5279565567,0.4263697127,1.1586755834,-0.706294853,2.2949083298,3.5934162583,0.8281677416,3.8458638112,4.6012848396,3.6713858224,4.6510458568,8.000702256,1.5113159784,-0.353147426,4.9176607066,6.8350295263,1.0540316711,4.1977729181,4.8275775367,3.9228506048,5.1790024135,8.4270719687 +050,1,1,23,015,Maine,Lincoln County,34457,34444,34384,34271,34155,34091,34052,33789,33992,34228,34396,34685,34775,-60,-113,-116,-64,-39,-263,203,236,168,289,90,70,296,273,251,270,258,280,305,289,297,292,78,392,413,425,421,428,412,422,442,418,454,-8,-96,-140,-174,-151,-170,-132,-117,-153,-121,-162,4,31,17,34,37,11,39,9,14,22,18,-53,-46,13,81,82,-102,299,342,310,391,236,-49,-15,30,115,119,-91,338,351,324,413,254,-3,-2,-6,-5,-7,-2,-3,2,-3,-3,-2,498,498,498,498,502,503,501,494,503,504,509,510,8.6228242663,7.9794230263,7.3557424611,7.9245116887,7.6060199584,8.261902303,8.9416593374,8.4227092562,8.5986016416,8.4077166715,11.41941592,12.071434835,12.454942414,12.356368226,12.617738536,12.156799103,12.371738493,12.881790627,12.101735644,13.072271811,-2.796591654,-4.092011808,-5.099199953,-4.431856537,-5.011718577,-3.8948968,-3.430079156,-4.459081371,-3.503134002,-4.66455514,0.9030660549,0.4968871482,0.9963953931,1.0859516018,0.3242876726,1.1507649636,0.2638522427,0.4080205176,0.6369334549,0.5182839044,-1.340033501,0.3799725251,2.3737654954,2.4067035499,-3.007031146,8.8225313879,10.026385224,9.0347400326,11.320044585,6.7952778578,-0.436967446,0.8768596732,3.3701608886,3.4926551517,-2.682743474,9.9732963515,10.290237467,9.4427605502,11.95697804,7.3135617622 +050,1,1,23,017,Maine,Oxford County,57833,57829,57777,57770,57486,57420,57348,57195,57353,57549,57777,57895,58132,-52,-7,-284,-66,-72,-153,158,196,228,118,237,124,516,509,576,506,477,521,490,490,460,471,113,613,620,604,653,648,660,650,711,710,775,11,-97,-111,-28,-147,-171,-139,-160,-221,-250,-304,2,21,0,15,40,15,34,10,13,15,15,-64,73,-172,-48,44,11,267,348,438,356,530,-62,94,-172,-33,84,26,301,358,451,371,545,-1,-4,-1,-5,-9,-8,-4,-2,-2,-3,-4,849,849,848,849,942,942,939,1099,928,999,938,938,8.9314305001,8.8325119733,10.025586131,8.8177889307,8.3287499018,9.0966232496,8.529007328,8.4976501396,7.9535237568,8.1187999345,10.610400962,10.758658985,10.512941013,11.3794786,11.314528168,11.523553445,11.313989313,12.330263774,12.276091016,13.358959553,-1.678970462,-1.926147012,-0.487354881,-2.56168967,-2.985778267,-2.426930195,-2.784981985,-3.832613634,-4.322567259,-5.240159618,0.3634884506,0,0.2610829722,0.6970584135,0.2619103743,0.5936376017,0.174061374,0.2254478608,0.2593540355,0.2585605075,1.2635550901,-2.984660235,-0.835465511,0.7667642548,0.1920676078,4.6618011663,6.0573358166,7.5958586962,6.155335777,9.1358045972,1.6270435407,-2.984660235,-0.574382539,1.4638226683,0.4539779821,5.255438768,6.2313971906,7.8213065571,6.4146898126,9.3943651047 +050,1,1,23,019,Maine,Penobscot County,153923,153932,153864,153781,153392,153289,153288,152029,151419,151785,151798,151823,151655,-68,-83,-389,-103,-1,-1259,-610,366,13,25,-168,417,1445,1482,1463,1452,1435,1405,1475,1432,1371,1350,374,1437,1488,1594,1463,1587,1597,1651,1697,1683,1728,43,8,-6,-131,-11,-152,-192,-176,-265,-312,-378,27,124,70,144,213,33,183,65,87,170,120,-127,-212,-436,-90,-178,-1142,-598,486,197,166,83,-100,-88,-366,54,35,-1109,-415,551,284,336,203,-11,-3,-17,-26,-25,2,-3,-9,-6,1,7,7318,7319,7316,7320,7511,7567,7471,7431,7368,7595,7265,7264,9.3939443189,9.6492855817,9.5408584164,9.4723348457,9.4000661607,9.2602356911,9.7294230947,9.4339933395,9.0309958797,8.8968557853,9.3419363227,9.6883515153,10.395166313,9.5440949582,10.395752611,10.525691387,10.890357647,11.179809146,11.08618969,11.387975405,0.0520079962,-0.039065934,-0.854307896,-0.071760112,-0.99568645,-1.265455696,-1.160934552,-1.745815807,-2.055193811,-2.49111962,0.8061239416,0.4557692245,0.9390865427,1.3895367232,0.2161687689,1.2061374601,0.4287542381,0.5731546233,1.1198171404,0.7908316254,-1.3782119,-2.83879117,-0.586929089,-1.161209093,-7.480749516,-3.941367219,3.205762457,1.2978328826,1.0934685018,0.5469918742,-0.572087959,-2.383021945,0.3521574535,0.2283276306,-7.264580747,-2.735229759,3.634516695,1.8709875059,2.2132856423,1.3378234996 +050,1,1,23,021,Maine,Piscataquis County,17535,17535,17550,17366,17269,17176,17042,16940,16919,16809,16714,16880,16996,15,-184,-97,-93,-134,-102,-21,-110,-95,166,116,35,142,132,157,137,132,152,142,124,134,140,35,232,221,230,226,235,233,253,260,227,247,0,-90,-89,-73,-89,-103,-81,-111,-136,-93,-107,0,1,1,2,1,7,21,9,10,136,107,17,-94,-5,-22,-45,-3,41,-7,32,123,118,17,-93,-4,-20,-44,4,62,2,42,259,225,-2,-1,-4,0,-1,-3,-2,-1,-1,0,-2,220,220,220,220,225,235,243,236,244,238,250,250,8.1338068507,7.6223473365,9.1159820003,8.0074814425,7.7688187864,8.9784104669,8.4203036053,7.3979059153,7.9776150503,8.2654386586,13.289036545,12.761657283,13.354623313,13.209421942,13.830851627,13.76295815,15.002371917,15.51173821,13.514318033,14.582595348,-5.155229694,-5.139309947,-4.238641312,-5.201940499,-6.062032841,-4.784547683,-6.582068311,-8.113832294,-5.536702983,-6.317156689,0.0572803299,0.0577450556,0.1161271592,0.0584487697,0.4119828144,1.2404382882,0.5336812144,0.5966053158,8.0966839317,6.3171566891,-5.384351014,-0.288725278,-1.277398752,-2.630194634,-0.176564063,2.4218080865,-0.415085389,1.9091370104,7.3227362029,6.9665840123,-5.327070684,-0.230980222,-1.161271592,-2.571745865,0.2354187511,3.6622463747,0.1185958254,2.5057423262,15.419420135,13.283740701 +050,1,1,23,023,Maine,Sagadahoc County,35293,35287,35229,35127,35124,35031,35090,35137,35206,35471,35821,36057,36044,-58,-102,-3,-93,59,47,69,265,350,236,-13,96,326,349,320,355,345,345,304,303,311,305,49,336,306,348,332,390,388,387,332,391,445,47,-10,43,-28,23,-45,-43,-83,-29,-80,-140,5,12,11,7,2,-1,21,2,3,8,5,-116,-102,-55,-72,42,97,93,346,379,309,123,-111,-90,-44,-65,44,96,114,348,382,317,128,6,-2,-2,0,-8,-4,-2,0,-3,-1,-1,265,265,265,265,261,258,263,257,259,264,272,273,9.2671556086,9.9358016256,9.1226569738,10.125354744,9.8252808749,9.8090783731,8.6025156699,8.5002524827,8.6535518517,8.4603542253,9.5514241856,8.7116197634,9.9208894591,9.469345845,11.10683925,11.031659156,10.95122883,9.3138080009,10.879545897,12.343795509,-0.284268577,1.2241818622,-0.798232485,0.6560088989,-1.281558375,-1.222580783,-2.34871316,-0.813555518,-2.225994045,-3.883441284,0.3411222923,0.313162802,0.1995581213,0.0570442521,-0.028479075,0.5970743358,0.0565954978,0.0841609157,0.2225994045,0.1386943316,-2.899539485,-1.56581401,-2.052597819,1.1979292936,2.762470275,2.6441863441,9.7910211243,10.632329013,8.5979020006,3.4118805564,-2.558417193,-1.252651208,-1.853039698,1.2549735457,2.7339912,3.2412606798,9.8476166221,10.716489929,8.8205014052,3.550574888 +050,1,1,23,025,Maine,Somerset County,52228,52222,52217,51937,51821,51715,51254,50749,50562,50373,50568,50729,50635,-5,-280,-116,-106,-461,-505,-187,-189,195,161,-94,136,493,497,478,506,446,456,483,451,488,475,171,568,532,531,594,586,622,632,633,555,585,-35,-75,-35,-53,-88,-140,-166,-149,-182,-67,-110,6,18,8,20,26,0,1,-5,-3,-3,-1,32,-221,-78,-70,-404,-367,-18,-31,382,232,16,38,-203,-70,-50,-378,-367,-17,-36,379,229,15,-8,-2,-11,-3,5,2,-4,-4,-2,-1,1,715,715,715,715,713,712,699,709,661,663,722,722,9.4667511569,9.579984194,9.2335033225,9.8282007206,8.744840838,9.0019839899,9.5705156784,8.9359130581,9.635033614,9.3721636873,10.906926282,10.254630968,10.257301808,11.53745302,11.489858141,12.279022021,12.522910784,12.541979968,10.957876344,11.542559489,-1.440175125,-0.674646774,-1.023798486,-1.709252299,-2.745017303,-3.277038031,-2.952395106,-3.60606691,-1.32284273,-2.170395801,0.3456420301,0.154204977,0.3863390512,0.5050063611,0,0.019741193,-0.099073661,-0.059440663,-0.059231764,-0.019730871,-4.243716036,-1.503498525,-1.352186679,-7.847021919,-7.195866788,-0.355341473,-0.6142567,7.5687778009,4.5805897509,0.3156939347,-3.898074006,-1.349293548,-0.965847628,-7.342015558,-7.195866788,-0.33560028,-0.713330361,7.5093371375,4.5213579869,0.2959630638 +050,1,1,23,027,Maine,Waldo County,38786,38791,38824,38865,38934,39041,39056,39143,39468,39791,39678,39755,39923,33,41,69,107,15,87,325,323,-113,77,168,111,374,398,378,349,330,359,331,345,355,346,112,371,366,358,380,411,375,432,435,435,485,-1,3,32,20,-31,-81,-16,-101,-90,-80,-139,7,48,30,91,75,18,60,17,19,38,27,28,-7,13,4,-21,151,283,410,-39,118,282,35,41,43,95,54,169,343,427,-20,156,309,-1,-3,-6,-8,-8,-1,-2,-3,-3,1,-2,501,501,501,501,498,498,549,585,587,558,574,574,9.6281326829,10.231493978,9.6954151972,8.937603237,8.4400056267,9.1335818142,8.3523637694,8.682630963,8.9383505596,8.6849569517,9.5509016721,9.4088612964,9.1824302661,9.7314877652,10.511643371,9.5406495274,10.900970237,10.947665127,10.952626742,12.174000351,0.0772310108,0.8226326817,0.5129849311,-0.793884528,-2.071637745,-0.407067713,-2.548606467,-2.265034164,-2.014276182,-3.4890434,1.2356961732,0.7712181391,2.3340814364,1.9206883747,0.4603639433,1.5265039244,0.4289733658,0.4781738791,0.9567811867,0.6777278546,-0.180205692,0.3341945269,0.1025969862,-0.537792745,3.8619419686,7.2000101767,10.345828234,-0.981514805,2.9710573691,7.078490926,1.0554904813,1.105412666,2.4366784226,1.3828956298,4.3223059118,8.7265141011,10.7748016,-0.503340925,3.9278385558,7.7562187806 +050,1,1,23,029,Maine,Washington County,32856,32855,32828,32724,32553,32268,31971,31783,31608,31370,31152,31286,31473,-27,-104,-171,-285,-297,-188,-175,-238,-218,134,187,87,294,311,304,284,328,290,273,286,310,302,92,405,407,448,443,418,420,450,451,425,447,-5,-111,-96,-144,-159,-90,-130,-177,-165,-115,-145,2,8,8,53,81,22,62,25,36,84,71,-20,1,-79,-187,-221,-118,-105,-84,-90,166,264,-18,9,-71,-134,-140,-96,-43,-59,-54,250,335,-4,-2,-4,-7,2,-2,-2,-2,1,-1,-3,836,836,836,836,777,768,770,726,536,341,340,341,8.9699780327,9.5286241708,9.3796763395,8.8419807282,10.28955046,9.1495638182,8.6696941789,9.1487796296,9.9298504116,9.6241176564,12.356602392,12.469935812,13.822680921,13.792244587,13.11290272,13.251092426,14.290704691,14.426921724,13.613504597,14.244968849,-3.386624359,-2.941311641,-4.443004582,-4.950263858,-2.82335226,-4.101528608,-5.621010512,-5.278142094,-3.683654185,-4.620851193,0.2440810349,0.2451093034,1.6352725197,2.5218325316,0.6901527747,1.9561136439,0.7939280384,1.1515946387,2.6906691438,2.2626236874,0.0305101294,-2.420454371,-5.769735117,-6.880555426,-3.701728519,-3.312773107,-2.667598209,-2.878986597,5.3172747365,8.4131359646,0.2745911643,-2.175345068,-4.134462597,-4.358722894,-3.011575744,-1.356659463,-1.873670171,-1.727391958,8.0079438803,10.675759652 +050,1,1,23,031,Maine,York County,197131,197129,197215,198279,198950,199539,200974,201407,202749,204537,206041,207978,209066,86,1064,671,589,1435,433,1342,1788,1504,1937,1088,488,1815,1894,1777,1837,1870,1859,1885,1824,1899,1871,391,1788,1674,1761,1819,2039,2002,2104,2091,2140,2257,97,27,220,16,18,-169,-143,-219,-267,-241,-386,11,51,-13,178,380,30,168,12,30,182,140,1,990,505,434,1058,593,1322,1992,1740,2000,1332,12,1041,492,612,1438,623,1490,2004,1770,2182,1472,-23,-4,-41,-39,-21,-21,-5,3,1,-4,2,3105,3105,3103,3156,3303,3370,3360,3511,3601,3557,3547,3551,9.1783946153,9.536061063,8.9186903528,9.1732353257,9.2946734563,9.1994180465,9.2563947693,8.885035243,9.1734920378,8.9726743461,9.0418565136,8.4283876555,8.8383870069,9.0833506029,10.134673357,9.9070655885,10.331806151,10.185640731,10.337689816,10.823797969,0.1365381017,1.1076734075,0.0803033459,0.0898847228,-0.839999901,-0.707647542,-1.075411382,-1.300605488,-1.164197778,-1.851123622,0.2579053032,-0.065453429,0.893374723,1.8975663711,0.1491124084,0.8313621473,0.0589266511,0.1461354481,0.879186704,0.6713919874,5.0063970629,2.5426139582,2.1782282572,5.2832242649,2.9474552725,6.5420283257,9.7818240745,8.4758559884,9.6613923516,6.3878151946,5.2643023662,2.4771605296,3.0716029803,7.180790636,3.0965676809,7.373390473,9.8407507255,8.6219914365,10.540579056,7.059207182 +040,3,5,24,000,Maryland,Maryland,5773552,5773787,5788784,5840241,5888375,5925197,5960064,5988528,6007014,6028186,6042153,6054954,6055802,14997,51457,48134,36822,34867,28464,18486,21172,13967,12801,848,18458,73558,72718,72369,72748,74145,73498,71770,71695,70804,69753,10610,43695,43469,45725,44768,47190,47256,49829,50070,51671,55635,7848,29863,29249,26644,27980,26955,26242,21941,21625,19133,14118,6709,21160,26172,21774,23752,27935,22015,23450,16629,16757,13078,851,520,-6488,-11004,-16296,-26121,-29699,-24085,-24238,-23055,-26379,7560,21680,19684,10770,7456,1814,-7684,-635,-7609,-6298,-13301,-411,-86,-799,-592,-569,-305,-72,-134,-49,-34,31,138537,139055,141775,140579,139846,140729,140673,140375,140252,140206,140111,140092,12.650759629,12.40009904,12.25184051,12.241716863,12.410667299,12.254219109,11.926681734,11.879533789,11.70593928,11.519181792,7.5148174503,7.4124687857,7.7410964271,7.5333642231,7.8988386247,7.8789270214,8.2805437384,8.2963701351,8.5427036398,9.1877005862,5.1359421792,4.9876302541,4.5107440832,4.7083526395,4.511828674,4.3752920877,3.6461379952,3.5831636543,3.1632356397,2.3314812056,3.6391700938,4.4629306646,3.6862686408,3.9968831984,4.6758647379,3.6705302687,3.8969024196,2.7553492905,2.770414447,2.1597330505,0.0894314012,-1.106353895,-1.862942047,-2.742219965,-4.372230636,-4.95167288,-4.002426216,-4.016125811,-3.811655134,-4.356292869,3.728601495,3.3565767692,1.8233265942,1.2546632337,0.3036341018,-1.281142611,-0.105523797,-1.26077652,-1.041240687,-2.196559818 +050,3,5,24,001,Maryland,Allegany County,75087,75042,74968,74580,73966,73602,73051,72501,72084,71363,70977,70527,70057,-74,-388,-614,-364,-551,-550,-417,-721,-386,-450,-470,194,703,674,676,709,635,658,643,653,649,650,181,908,908,896,909,963,916,944,904,851,931,13,-205,-234,-220,-200,-328,-258,-301,-251,-202,-281,11,57,81,71,80,83,48,51,30,36,33,-96,-239,-462,-209,-432,-301,-204,-469,-164,-284,-225,-85,-182,-381,-138,-352,-218,-156,-418,-134,-248,-192,-2,-1,1,-6,1,-4,-3,-2,-1,0,3,7924,7854,7887,7749,7677,7597,7600,7593,7600,7595,7603,7600,9.4016636799,9.0746300809,9.1618779139,9.6690828009,8.7254039793,9.1019123699,8.9649835828,9.1752142757,9.1728855721,9.2471404996,12.143258352,12.225169308,12.143554158,12.396609684,13.232384303,12.670747311,13.161655524,12.701981172,12.027928539,13.244750469,-2.741594672,-3.150539227,-2.981676244,-2.727526883,-4.506980323,-3.568834941,-4.196671942,-3.526766896,-2.855042967,-3.99760997,0.7622970551,1.0905712709,0.9622682424,1.0910107533,1.1404858745,0.6639692914,0.7110640167,0.4215259238,0.5088195387,0.46947021,-3.196298179,-6.220295397,-2.832592432,-5.891458068,-4.135978894,-2.821869489,-6.539000467,-2.304341717,-4.014020805,-3.20093325,-2.434001123,-5.129724126,-1.87032419,-4.800447314,-2.99549302,-2.157900197,-5.82793645,-1.882815793,-3.505201266,-2.73146304 +050,3,5,24,003,Maryland,Anne Arundel County,537656,537635,539305,544863,550476,555638,559421,563133,567434,571359,575641,579895,582777,1670,5558,5613,5162,3783,3712,4301,3925,4282,4254,2882,1813,6951,6920,6770,6873,6962,7072,6845,6850,6859,6775,892,3745,3876,3981,4026,4197,4146,4407,4625,4634,5025,921,3206,3044,2789,2847,2765,2926,2438,2225,2225,1750,369,724,1435,985,1070,1516,874,737,380,391,317,399,1636,1211,1421,-18,-497,521,769,1689,1626,779,768,2360,2646,2406,1052,1019,1395,1506,2069,2017,1096,-19,-8,-77,-33,-116,-72,-20,-19,-12,12,36,14133,14202,14136,14081,14049,14204,14255,14206,14231,14164,14233,14228,12.82273596,12.635357638,12.241052911,12.327598809,12.403857632,12.510536748,12.021499957,11.944202267,11.871547057,11.65418966,6.9085234023,7.0772610123,7.1981730635,7.2211425584,7.4775912785,7.3343729297,7.7397736024,8.064516129,8.0205203473,8.6438823675,5.9142125575,5.5580966258,5.0428798478,5.1064562503,4.9262663533,5.1761638187,4.2817263541,3.8796861378,3.8510267097,3.0103072922,1.3355863667,2.6201933831,1.781009914,1.9191809581,2.7009836498,1.5461268549,1.2943528806,0.662598082,0.6767422218,0.5452956638,3.0179824529,2.2111875867,2.5693554191,-0.032285287,-0.885480788,0.9216614318,1.3505527343,2.9450741064,2.8142783955,1.3400167889,4.3535688196,4.8313809697,4.350365333,1.886895671,1.8155028622,2.4677882868,2.644905615,3.6076721883,3.4910206173,1.8853124527 +050,3,5,24,005,Maryland,Baltimore County,805029,805311,806654,813021,818218,822426,825201,827796,828941,828956,828547,828503,826017,1343,6367,5197,4208,2775,2595,1145,15,-409,-44,-2486,2409,9951,9665,9538,9851,10070,9874,9701,9871,9746,9563,1872,7591,7512,7846,7651,8131,8227,8543,8382,8640,9067,537,2360,2153,1692,2200,1939,1647,1158,1489,1106,496,884,2900,3290,2642,2863,3324,2512,2733,1831,1941,1500,22,1142,-65,24,-2179,-2598,-2996,-3871,-3737,-3111,-4509,906,4042,3225,2666,684,726,-484,-1138,-1906,-1170,-3009,-100,-35,-181,-150,-109,-70,-18,-5,8,20,27,20781,20787,21378,21221,21287,21437,21432,21427,21413,21416,21400,21400,12.2876503,11.849888336,11.627141537,11.957803556,12.183930158,11.919815879,11.702777676,11.910687341,11.763072931,11.559848173,9.3734854215,9.2101770495,9.5645368526,9.2872962145,9.837888393,9.9315703096,10.305827202,10.114008843,10.428170544,10.96027851,2.9141648788,2.6397112869,2.0626046845,2.6705073418,2.3460417654,1.9882455695,1.396950474,1.7966784977,1.3349023868,0.5995696637,3.5809653171,4.0337436758,3.2206865109,3.4753011452,4.0217858835,3.0324668309,3.2969478804,2.2093474341,2.3427174799,1.8132147088,1.4101594456,-0.079694024,0.029256804,-2.645016135,-3.143381385,-3.61674786,-4.669771403,-4.509192442,-3.754865574,-5.450523415,4.9911247627,3.9540496518,3.2499433149,0.8302850099,0.878404498,-0.58428103,-1.372823523,-2.299845008,-1.412148095,-3.637308706 +050,3,5,24,009,Maryland,Calvert County,88737,88741,88989,89346,89746,90486,90595,90542,91116,91492,92131,92660,93072,248,357,400,740,109,-53,574,376,639,529,412,232,933,908,953,908,880,923,927,888,891,888,90,651,612,641,639,665,658,726,693,747,830,142,282,296,312,269,215,265,201,195,144,58,20,46,126,74,84,109,56,51,10,31,16,92,27,-13,366,-251,-380,258,128,440,359,341,112,73,113,440,-167,-271,314,179,450,390,357,-6,2,-9,-12,7,3,-5,-4,-6,-5,-3,650,653,645,625,640,642,641,642,642,642,642,642,10.463453613,10.140039756,10.575258556,10.028661207,9.716402502,10.16195268,10.152895821,9.6719909815,9.6433267854,9.5621648397,7.300866347,6.8344761352,7.1130542856,7.0576151004,7.3425087089,7.2443823008,7.9514588627,7.548074043,8.0848093251,8.9376090281,3.1625872655,3.3055636209,3.4622042701,2.9710461064,2.3738937931,2.9175703795,2.2014369579,2.1239169385,1.5585174603,0.6245558116,0.5158830291,1.4070980278,0.8211638333,0.9277616094,1.2035089463,0.6165431745,0.5585735565,0.1089188174,0.3355141755,0.1722912584,0.3028009084,-0.145176781,4.0614319322,-2.772240047,-4.195719262,2.8405024827,1.4019101025,4.7924279638,3.8854706127,3.6719574441,0.8186839375,1.2619212472,4.8825957655,-1.844478438,-2.992210316,3.4570456572,1.960483659,4.9013467812,4.2209847882,3.8442487024 +050,3,5,24,011,Maryland,Caroline County,33066,33078,33054,32890,32636,32651,32542,32601,32834,33122,33341,33509,33492,-24,-164,-254,15,-109,59,233,288,219,168,-17,101,418,398,379,366,412,368,383,390,445,425,97,291,322,327,347,343,334,342,355,358,381,4,127,76,52,19,69,34,41,35,87,44,4,28,51,61,61,68,64,72,58,62,45,-34,-320,-389,-95,-191,-74,135,177,128,17,-109,-30,-292,-338,-34,-130,-6,199,249,186,79,-64,2,1,8,-3,2,-4,0,-2,-2,2,3,442,442,439,440,440,441,441,441,441,441,442,441,12.677423268,12.147849709,11.610274634,11.228199347,12.649095068,11.247803163,11.613803141,11.735853031,13.313388182,12.686377815,8.8256702657,9.8281598144,10.017308193,10.645314681,10.530678661,10.208603958,10.370550064,10.682635451,10.710545999,11.372964583,3.8517530025,2.3196898941,1.5929664405,0.5828846655,2.118416407,1.0391992053,1.2432530778,1.0532175797,2.602842184,1.3134132326,0.8492053864,1.5566340079,1.8686721706,1.8713665578,2.0877147199,1.9561396806,2.1832736976,1.7453319892,1.8548990277,1.3432635334,-9.705204416,-11.87314959,-2.910227151,-5.859524796,-2.271924842,4.1262321388,5.3672145066,3.8517671486,0.5086013463,-3.253682781,-8.855999029,-10.31651558,-1.04155498,-3.988158238,-0.184210122,6.0823718194,7.5504882043,5.5970991379,2.363500374,-1.910419247 +050,3,5,24,013,Maryland,Carroll County,167134,167155,167230,167072,167085,167264,167383,167201,167189,167687,168421,168774,169092,75,-158,13,179,119,-182,-12,498,734,353,318,412,1549,1588,1579,1571,1659,1700,1639,1709,1708,1713,356,1399,1339,1478,1502,1549,1510,1611,1702,1587,1704,56,150,249,101,69,110,190,28,7,121,9,17,35,86,60,61,79,79,82,63,64,47,12,-343,-320,30,4,-368,-276,400,676,171,266,29,-308,-234,90,65,-289,-197,482,739,235,313,-10,0,-2,-12,-15,-3,-5,-12,-12,-3,-4,3319,3319,3343,3380,3400,3355,3359,3362,3364,3366,3366,3367,9.2670698949,9.5045143451,9.4452204134,9.388997959,9.9167921957,10.167768175,9.7886979061,10.169350328,10.130636575,10.14011472,8.3696777166,8.0141969194,8.8410612863,8.9766231283,9.2592592593,9.0313705553,9.6214718284,10.12769705,9.4129509631,10.086839161,0.8973921783,1.4903174256,0.6041591271,0.4123748308,0.6575329364,1.1363976195,0.1672260777,0.0416532781,0.7176856122,0.0532755589,0.2093915083,0.5147281068,0.3589064122,0.3645632562,0.4722281998,0.4725021681,0.4897335133,0.374879503,0.3796023073,0.2782168078,-2.052036781,-1.915267374,0.1794532061,0.0239057873,-2.199746551,-1.650767068,2.3889439673,4.0225165721,1.0142499147,1.5745887423,-1.842645273,-1.400539267,0.5383596182,0.3884690435,-1.727518351,-1.1782649,2.8786774806,4.3973960751,1.393852222,1.8528055501 +050,3,5,24,015,Maryland,Cecil County,101108,101091,101161,101583,101780,101940,102252,102453,102609,102509,102816,103092,103419,70,422,197,160,312,201,156,-100,307,276,327,299,1154,1165,1101,1058,1016,1168,1102,1165,1165,1152,227,842,806,907,865,912,967,983,1019,995,1096,72,312,359,194,193,104,201,119,146,170,56,16,83,94,82,90,98,67,69,47,7,16,-5,31,-247,-100,48,10,-109,-286,119,100,250,11,114,-153,-18,138,108,-42,-217,166,107,266,-13,-4,-9,-16,-19,-11,-3,-2,-5,-1,5,1551,1543,1469,1472,1414,1444,1428,1412,1370,1346,1356,1357,11.383814071,11.457344748,10.808953466,10.3627958,9.9264795682,11.391676664,10.745034565,11.347863144,11.31573324,11.156790679,8.3060411159,7.9267123321,8.9043785588,8.4724181163,8.9103832344,9.4312939501,9.5847268402,9.9257275052,9.6645103639,10.614446688,3.0777729551,3.5306324159,1.9045749067,1.8903776837,1.0160963337,1.9603827135,1.1603077253,1.4221356386,1.6512228762,0.5423439914,0.8187665233,0.9244552844,0.805026507,0.8815232722,0.9574753914,0.6534609045,0.672783471,0.4578107878,0.0679915302,0.1549554261,0.3058043641,-2.429153779,-0.981739643,0.4701457452,0.0977015706,-1.063093113,-2.788638735,1.159137952,0.9713075743,2.4211785329,1.1245708874,-1.504698495,-0.176713136,1.3516690174,1.055176962,-0.409632209,-2.115855264,1.6169487398,1.0392991045,2.576133959 +050,3,5,24,017,Maryland,Charles County,146551,146564,147159,149215,150700,152710,154448,155775,157474,159718,161879,163733,164436,595,2056,1485,2010,1738,1327,1699,2244,2161,1854,703,439,1843,1916,1839,1812,1903,1825,1832,1800,1922,1847,185,948,891,992,941,961,1020,1113,1109,1225,1297,254,895,1025,847,871,942,805,719,691,697,550,82,173,241,186,195,217,203,180,102,123,101,258,986,237,984,695,182,699,1356,1373,1036,50,340,1159,478,1170,890,399,902,1536,1475,1159,151,1,2,-18,-7,-23,-14,-8,-11,-5,-2,2,1405,1396,1431,1409,1376,1406,1407,1407,1407,1407,1407,1407,12.4369884,12.77695347,12.12221087,11.798488075,12.268593882,11.652072313,11.551363212,11.194134274,11.805461715,11.256395333,6.3973223022,5.941683477,6.5390066247,6.1271397782,6.195543206,6.512391101,7.0178314712,6.8968305053,7.5242927165,7.9044638586,6.0396660976,6.8352699932,5.5832042451,5.6713482963,6.0730506764,5.1396812121,4.533531741,4.2973037684,4.2811689987,3.3519314743,1.1674438379,1.6071220179,1.2260637421,1.2697048425,1.3989936272,1.296093523,1.1349592676,0.6343342755,0.7555004115,0.6155365071,6.6537550527,1.5804477935,6.4862727003,4.5253582847,1.1733494938,4.4629033133,8.5500264824,8.5386368654,6.3634018402,0.3047210431,7.8211988906,3.1875698114,7.7123364424,5.7950631271,2.5723431209,5.7589968364,9.68498575,9.1729711409,7.1189022518,0.9202575502 +050,3,5,24,019,Maryland,Dorchester County,32618,32623,32689,32702,32483,32563,32502,32431,32268,32093,31894,31864,31853,66,13,-219,80,-61,-71,-163,-175,-199,-30,-11,80,373,361,403,400,382,365,358,367,356,355,54,328,378,379,370,386,412,444,405,400,407,26,45,-17,24,30,-4,-47,-86,-38,-44,-52,6,16,17,13,33,70,49,35,47,3,13,33,-47,-220,48,-119,-135,-163,-122,-206,12,29,39,-31,-203,61,-86,-65,-114,-87,-159,15,42,1,-1,1,-5,-5,-2,-2,-2,-2,-1,-1,506,521,519,526,508,502,501,500,500,499,499,499,11.408297778,11.07616783,12.391230821,12.295396911,11.765974158,11.283018285,11.12474946,11.471080063,11.167226074,11.143023055,10.031961585,11.597760221,11.653291517,11.373242142,11.889178076,12.735900091,13.797175308,12.658821323,12.547445027,12.775240517,1.3763361931,-0.521592391,0.7379393045,0.9221547683,-0.123203918,-1.452881807,-2.672425848,-1.18774126,-1.380218953,-1.632217462,0.4893639798,0.5215923909,0.3997171233,1.0143702451,2.156068563,1.5147065642,1.0876151707,1.4690484005,0.0941058377,0.4080543654,-1.437506691,-6.750019176,1.475878609,-3.657880581,-4.158132229,-5.038717755,-3.791115738,-6.438807883,0.3764233508,0.9102751228,-0.948142711,-6.228426785,1.8755957323,-2.643510336,-2.002063666,-3.52401119,-2.703500567,-4.969759482,0.4705291885,1.3183294882 +050,3,5,24,021,Maryland,Frederick County,233385,233415,234239,237326,239705,241215,243487,245145,247269,251037,255698,260609,265161,824,3087,2379,1510,2272,1658,2124,3768,4661,4911,4552,710,2852,2723,2704,2785,2829,2843,2811,2831,2939,2994,370,1512,1576,1710,1587,1823,1792,1940,1855,1898,2013,340,1340,1147,994,1198,1006,1051,871,976,1041,981,199,535,757,601,669,774,635,694,474,475,387,288,1212,528,-59,446,-97,451,2209,3216,3404,3195,487,1747,1285,542,1115,677,1086,2903,3690,3879,3582,-3,0,-53,-26,-41,-25,-13,-6,-5,-9,-11,4182,4181,4368,4360,4237,4325,4355,4367,4344,4353,4367,4367,12.095893461,11.416448826,11.245113532,11.491596899,11.579266196,11.547194028,11.282224176,11.173493049,11.384699413,11.389010404,6.412689661,6.6075370364,7.1113698744,6.5483534213,7.4616480296,7.2784283144,7.7863802563,7.321380998,7.3522148644,7.6573406623,5.6832038001,4.8089117898,4.133743658,4.9432434774,4.1176181666,4.2687657134,3.4958439192,3.8521120507,4.0324845489,3.7316697415,2.2690403232,3.1737979293,2.4993761956,2.7604590037,3.1680282912,2.579130569,2.7854370608,1.8708003197,1.8399905483,1.4721265953,5.1403306013,2.2136926112,-0.245363054,1.8403060025,-0.397026801,1.8317919474,8.8660381372,12.693024954,13.185953318,12.153603287,7.4093709245,5.3874905404,2.2540131415,4.6007650061,2.7710014899,4.4109225164,11.651475198,14.563825274,15.025943867,13.625729882 +050,3,5,24,023,Maryland,Garrett County,30097,30139,30144,30158,29976,29981,29669,29451,29395,29276,29202,29049,28852,5,14,-182,5,-312,-218,-56,-119,-74,-153,-197,73,271,301,293,288,285,310,288,276,264,262,55,301,306,294,312,282,353,336,333,365,378,18,-30,-5,-1,-24,3,-43,-48,-57,-101,-116,4,14,15,10,15,3,3,2,2,-2,0,-13,29,-192,0,-306,-223,-16,-72,-18,-49,-81,-9,43,-177,10,-291,-220,-13,-70,-16,-51,-81,-4,1,0,-4,3,-1,0,-1,-1,-1,0,515,515,523,540,545,526,526,525,527,528,528,528,8.9880932639,10.010975488,9.773671131,9.6563285834,9.6414073072,10.535975257,9.8174566651,9.4394473135,9.0642220734,9.049930053,9.9830851381,10.177270762,9.8070283703,10.461022632,9.5399188092,11.997416987,11.453699443,11.388898389,12.5319737,13.056769313,-0.994991874,-0.166295274,-0.033357239,-0.804694049,0.101488498,-1.461441729,-1.636242778,-1.949451076,-3.467751627,-4.00683926,0.4643295413,0.4988858217,0.3335723935,0.5029337804,0.101488498,0.1019610509,0.0681767824,0.0684017921,-0.068668349,0,0.9618254784,-6.385738517,0,-10.25984912,-7.543978349,-0.543792271,-2.454364166,-0.615616129,-1.682374552,-2.797879139,1.4261550197,-5.886852696,0.3335723935,-9.756915339,-7.442489851,-0.44183122,-2.386187384,-0.547214337,-1.751042901,-2.797879139 +050,3,5,24,025,Maryland,Harford County,244826,244824,245236,246746,248609,248961,249415,249690,250448,251948,253884,255594,256805,412,1510,1863,352,454,275,758,1500,1936,1710,1211,683,2776,2613,2654,2658,2820,2675,2607,2634,2716,2659,466,1842,1845,2017,1927,2017,2080,2231,2199,2255,2401,217,934,768,637,731,803,595,376,435,461,258,117,246,362,237,272,362,279,268,184,166,156,102,339,771,-505,-525,-883,-106,875,1330,1087,796,219,585,1133,-268,-253,-521,173,1143,1514,1253,952,-24,-9,-38,-17,-24,-7,-10,-19,-13,-4,1,2743,2763,2743,2753,2749,2764,2769,2755,2748,2751,2755,2755,11.28496571,10.550009589,10.66784573,10.666645264,11.300227407,10.697047615,10.378267343,10.414524981,10.661893153,10.378630716,7.4880788322,7.4492030968,8.1074019736,7.7331171646,8.082467617,8.3177043136,8.8814401389,8.6945863449,8.8521977396,9.3716029891,3.796886878,3.1008064923,2.5604437567,2.9335280993,3.21775979,2.3793433012,1.496827204,1.7199386358,1.8096954137,1.0070277264,1.0000365867,1.4615780602,0.9526297807,1.0915453393,1.4505965679,1.115692069,1.0668874752,0.7275142735,0.6516473724,0.6089004858,1.3780991988,3.1129190177,-2.029865145,-2.106843026,-3.538333617,-0.423883008,3.4833079881,5.2586629553,4.2671126133,3.1069537606,2.3781357855,4.5744970779,-1.077235364,-1.015297687,-2.087737049,0.6918090607,4.5501954633,5.9861772288,4.9187599857,3.7158542464 +050,3,5,24,027,Maryland,Howard County,287085,287110,288618,293596,299223,303590,306989,311417,315581,319409,322895,325951,328200,1508,4978,5627,4367,3399,4428,4164,3828,3486,3056,2249,912,3315,3391,3452,3456,3645,3597,3519,3431,3428,3370,393,1421,1472,1503,1544,1626,1632,1632,1693,1867,2067,519,1894,1919,1949,1912,2019,1965,1887,1738,1561,1303,417,1210,1505,1266,1462,1569,1212,1284,815,857,689,569,1874,2217,1198,34,871,1001,675,953,646,255,986,3084,3722,2464,1496,2440,2213,1959,1768,1503,944,3,0,-14,-46,-9,-31,-14,-18,-20,-8,2,2322,2322,2419,2467,2237,1689,1689,1685,1686,1685,1688,1690,11.387565397,11.440254108,11.452971319,11.320402438,11.78837204,11.473720809,11.083639112,10.683414707,10.566451824,10.303431471,4.8813666453,4.9661026384,4.9866210583,5.0574946076,5.25868119,5.2057582321,5.140238429,5.2716470705,5.7548324256,6.3196417952,6.5061987517,6.4741514695,6.4663502612,6.2629078301,6.5296908503,6.2679625772,5.9434006835,5.4117676365,4.8116193981,3.9837896755,4.1565472489,5.0774351025,4.2003075581,4.788897096,5.0743362775,3.86604104,4.0441581757,2.5377391391,2.6416129559,2.1065472651,6.4374954913,7.4795173569,3.9746986213,0.1113696999,2.8169196289,3.1929926411,2.1260177326,2.9674422081,1.9912275024,0.7796365059,10.59404274,12.556952459,8.1750061794,4.9002667959,7.8912559063,7.0590336811,6.1701759083,5.5051813472,4.6328404583,2.886183771 +050,3,5,24,029,Maryland,Kent County,20197,20195,20213,20258,19987,19833,19801,19745,19708,19486,19467,19426,19192,18,45,-271,-154,-32,-56,-37,-222,-19,-41,-234,41,163,183,183,164,159,160,138,156,150,147,43,235,229,243,260,252,273,246,271,289,321,-2,-72,-46,-60,-96,-93,-113,-108,-115,-139,-174,5,6,11,-1,6,19,17,15,12,5,6,18,109,-238,-92,61,22,60,-127,84,95,-65,23,115,-227,-93,67,41,77,-112,96,100,-59,-3,2,2,-1,-3,-4,-1,-2,0,-2,-1,1526,1527,1658,1520,1522,1500,1497,1501,1503,1507,1504,1502,8.0551506017,9.0942974283,9.1913611251,8.2757228642,8.0412683963,8.1109167871,7.0418941675,8.0096526583,7.7134702903,7.6130301932,11.613253935,11.380295689,12.20492215,13.120048443,12.744651798,13.839251768,12.552941777,13.914204297,14.861286093,16.624372054,-3.558103333,-2.285998261,-3.013561025,-4.844325579,-4.703383402,-5.728334981,-5.511047609,-5.904551639,-7.147815802,-9.011341861,0.2965086111,0.546651758,-0.050226017,0.3027703487,0.9609062864,0.8617849086,0.7654232791,0.6161271276,0.2571156763,0.3107359263,5.3865731017,-11.82755622,-4.620793571,3.0781652117,1.1126283316,3.0415937951,-6.480583763,4.3128898929,4.8851978505,-3.366305868,5.6830817128,-11.28090446,-4.671019588,3.3809355604,2.0735346179,3.9033787038,-5.715160484,4.9290170205,5.1423135269,-3.055569941 +050,3,5,24,031,Maryland,Montgomery County,971777,971279,975619,991325,1005310,1015534,1025063,1033370,1039327,1047239,1048794,1051129,1051816,4340,15706,13985,10224,9529,8307,5957,7912,1555,2335,687,3424,13192,13031,13112,13161,13177,13082,12799,12663,12184,11964,1476,5665,5661,5916,5606,6115,5647,5881,6036,6414,6906,1948,7527,7370,7196,7555,7062,7435,6918,6627,5770,5058,2181,7635,9207,8109,8693,10003,7803,8384,5924,6099,4680,311,577,-2466,-5053,-6787,-8786,-9309,-7405,-11041,-9554,-9065,2492,8212,6741,3056,1906,1217,-1506,979,-5117,-3455,-4385,-100,-33,-126,-28,68,28,28,15,45,20,14,8933,8936,9496,9497,9114,9113,9184,9065,9012,9045,8907,8907,13.413701661,13.052961608,12.976756246,12.899166273,12.802942821,12.623166821,12.268003984,12.082825032,11.604235012,11.378328962,5.7602046627,5.6705406847,5.8549794046,5.4944704907,5.9414127154,5.4489392323,5.6370131594,5.7594513063,6.1087954177,6.5679321142,7.6534969984,7.3824209232,7.1217768418,7.4046957827,6.8615301057,7.1742275885,6.6309908242,6.3233737255,5.4954395947,4.8103968482,7.7633120211,9.2225168847,8.0253597012,8.5200556504,9.7190435637,7.529320494,8.0361704351,5.6525827599,5.8087844173,4.4509009984,0.5866969268,-2.470156038,-5.00088082,-6.651974888,-8.536590698,-8.982499613,-7.097786507,-10.53513948,-9.099381263,-8.621243066,8.3500089479,6.7523608471,3.0244788811,1.8680807626,1.1824528658,-1.453179119,0.9383839284,-4.882556715,-3.290596846,-4.170342068 +050,3,5,24,033,Maryland,Prince George's County,863420,864028,866442,874594,882787,891020,900372,906754,909262,910946,911372,911562,909612,2414,8152,8193,8233,9352,6382,2508,1684,426,190,-1950,3019,12137,12014,11948,12054,12496,12289,12309,12385,11971,11802,1296,5162,4986,5278,5226,5611,5823,6572,6426,6889,7791,1723,6975,7028,6670,6828,6885,6466,5737,5959,5082,4011,1546,4858,5701,4724,5244,6391,5456,5995,4492,4617,3520,-780,-3677,-4417,-3023,-2598,-6873,-9430,-10047,-10030,-9498,-9475,766,1181,1284,1701,2646,-482,-3974,-4052,-5538,-4881,-5955,-75,-4,-119,-138,-122,-21,16,-1,5,-11,-6,19427,19458,19729,19667,20328,20274,20049,20033,20017,20009,20003,20003,13.942273451,13.672618516,13.471589637,13.457691002,13.829694222,13.534021727,13.524827932,13.592578244,13.133772259,12.960870296,5.9298027152,5.6743529149,5.9510420243,5.8345688716,6.2098602975,6.412939093,7.2211527474,7.05255614,7.5581452757,8.5560193589,8.0124707358,7.9982656009,7.5205476131,7.6231221307,7.6198339241,7.1210826336,6.3036751844,6.5400221037,5.5756269838,4.4048509368,5.5805853526,6.4880637722,5.3263968402,5.8546649756,7.0731094567,6.0087576321,6.5871592697,4.9299847776,5.0654604061,3.865638319,-4.223921849,-5.026798401,-3.408488071,-2.900537682,-7.606553168,-10.38537105,-11.0393977,-11.007958,-10.42056377,-10.40537587,1.3566635038,1.4612653716,1.9179087691,2.9541272932,-0.533443711,-4.376613422,-4.452238425,-6.077973219,-5.355103366,-6.539737554 +050,3,5,24,035,Maryland,Queen Anne's County,47798,47789,47809,48267,48506,48535,48803,49012,49135,49648,50279,50585,51167,20,458,239,29,268,209,123,513,631,306,582,114,483,447,438,476,437,509,462,501,505,500,123,349,424,413,400,415,415,443,412,434,437,-9,134,23,25,76,22,94,19,89,71,63,2,1,25,59,66,65,52,57,44,42,35,32,324,197,-48,135,127,-19,439,499,194,487,34,325,222,11,201,192,33,496,543,236,522,-5,-1,-6,-7,-9,-5,-4,-2,-1,-1,-3,426,426,423,424,457,437,437,437,437,437,436,436,10.054540156,9.2381139367,9.0271122515,9.7803529968,8.9352348822,10.372196807,9.3538361864,10.027319944,10.013483503,9.8278166523,7.2650818102,8.7627747409,8.5118661184,8.2187840309,8.4854061238,8.4567027011,8.9691546116,8.2460195943,8.6056472081,8.5895117541,2.7894583455,0.4753391959,0.5152461331,1.5615689659,0.4498287584,1.9154941058,0.3846815748,1.7813003493,1.4078362944,1.2383048982,0.0208168533,0.516673039,1.2159808741,1.3560993651,1.3290395134,1.0596350372,1.1540447243,0.8806428693,0.8328045685,0.6879471657,6.7446604771,4.0713835471,-0.989272576,2.7738396104,2.5967387415,-0.387174341,8.8881690169,9.9872907222,3.8467639594,9.5722934193,6.7654773304,4.588056586,0.2267082986,4.1299389755,3.9257782549,0.6724606967,10.042213741,10.867933592,4.6795685279,10.260240585 +050,3,5,24,037,Maryland,St. Mary's County,105151,105146,105772,107589,108847,109284,109998,111092,111886,112627,112948,113764,114687,626,1817,1258,437,714,1094,794,741,321,816,923,363,1484,1389,1381,1390,1512,1456,1322,1382,1347,1344,202,648,699,752,756,781,788,810,881,890,949,161,836,690,629,634,731,668,512,501,457,395,69,90,323,207,167,226,140,128,69,82,62,372,888,261,-393,-71,150,-11,106,-249,275,462,441,978,584,-186,96,376,129,234,-180,357,524,24,3,-16,-6,-16,-13,-3,-5,0,2,4,2926,2960,2928,2921,2859,2797,2806,2774,2785,2798,2787,2789,13.910695957,12.835203016,12.662115884,12.677739167,13.677687819,13.059584354,11.77660091,12.253130888,11.882917534,11.766199316,6.0742122506,6.4591842392,6.8949392796,6.8952307987,7.0649961554,7.0679618617,7.2156178039,7.8111492852,7.8513709023,8.3081273446,7.836483706,6.3760187769,5.7671766049,5.7825083682,6.612691664,5.9916224919,4.5609831057,4.4419816026,4.0315466319,3.4580719717,0.8436405904,2.9847160361,1.8979420623,1.5231528352,2.0444163011,1.2557292648,1.1402457764,0.6117699213,0.7233847348,0.5427859804,8.3239204916,2.4117984069,-3.603339278,-0.647567972,1.3569134742,-0.098664442,0.9442660336,-2.207691455,2.4259853912,4.044631015,9.1675610819,5.3965144431,-1.705397215,0.8755848633,3.4013297752,1.1570648225,2.08451181,-1.595921534,3.149370126,4.5874169953 +050,3,5,24,039,Maryland,Somerset County,26470,26470,26464,26268,26044,25968,25581,25705,25873,25922,25637,25609,25453,-6,-196,-224,-76,-387,124,168,49,-285,-28,-156,65,244,274,279,261,247,265,242,238,211,223,96,287,235,248,241,274,247,294,285,290,295,-31,-43,39,31,20,-27,18,-52,-47,-79,-72,14,29,38,38,42,51,34,40,29,25,25,10,-182,-307,-147,-461,100,117,63,-268,24,-108,24,-153,-269,-109,-419,151,151,103,-239,49,-83,1,0,6,2,12,0,-1,-2,1,2,-1,5651,5655,5702,5543,5414,5318,5333,5323,5317,5313,5319,5318,9.2543427141,10.475607891,10.728293471,10.12628761,9.6322583161,10.275698941,9.3445313254,9.2321418181,8.2347890567,8.7344796522,10.885230979,8.9845542132,9.5362608629,9.3503268735,10.685177241,9.5777269378,11.352447147,11.055295875,11.317956523,11.554580706,-1.630888265,1.4910536779,1.1920326079,0.7759607364,-1.052918925,0.6979720036,-2.007915822,-1.823154057,-3.083167467,-2.820101054,1.0999013882,1.4528215323,1.4612012612,1.6295175464,1.9888468588,1.3183915623,1.5445506323,1.1249248434,0.9756859072,0.9792017547,-6.902829402,-11.7372687,-5.652541721,-17.88589497,3.8996997231,4.5368180232,2.4326672459,-10.39585717,0.9366584709,-4.23015158,-5.802928013,-10.28444716,-4.19134046,-16.25637743,5.8885465819,5.8552095855,3.9772178782,-9.27093233,1.9123443781,-3.250949826 +050,3,5,24,041,Maryland,Talbot County,37782,37777,37876,37952,37995,37909,37533,37431,37170,37057,37052,37186,36972,99,76,43,-86,-376,-102,-261,-113,-5,134,-214,94,356,317,331,346,314,337,325,355,325,323,72,423,417,459,441,453,418,464,429,482,538,22,-67,-100,-128,-95,-139,-81,-139,-74,-157,-215,5,34,31,40,1,13,21,21,19,14,13,74,112,121,9,-281,27,-198,8,53,280,-12,79,146,152,49,-280,40,-177,29,72,294,1,-2,-3,-9,-7,-1,-3,-3,-3,-3,-3,0,383,383,384,389,382,374,374,374,373,373,372,371,9.3896713615,8.3479268437,8.7215430017,9.1726094218,8.3773544635,9.0347314379,8.7569213359,9.5804828024,8.7556238045,8.7111302894,11.156828612,10.981342252,12.094224283,11.691100448,12.085801185,11.206284098,12.50218923,11.577541189,12.985263612,14.509560668,-1.767157251,-2.633415408,-3.372681282,-2.518491026,-3.708446721,-2.17155266,-3.745267894,-1.997058387,-4.229639807,-5.798430378,0.896766366,0.8163587765,1.0539629005,0.0265104319,0.3468331466,0.5629951341,0.5658318402,0.5127582345,0.3771653331,0.3506027671,2.9540539115,3.1864326438,0.2371416526,-7.449431351,0.720345766,-5.308239836,0.2155549867,1.4303256015,7.5433066624,-0.323633323,3.8508202775,4.0027914203,1.2911045531,-7.422920919,1.0671789125,-4.745244702,0.7813868269,1.943083836,7.9204719955,0.0269694436 +050,3,5,24,043,Maryland,Washington County,147430,147416,147727,148807,149090,149055,149128,149160,149715,150247,150699,151066,151146,311,1080,283,-35,73,32,555,532,452,367,80,427,1739,1742,1728,1770,1739,1719,1619,1680,1683,1667,364,1402,1421,1522,1520,1544,1471,1580,1632,1642,1641,63,337,321,206,250,195,248,39,48,41,26,54,182,229,213,214,217,184,190,179,94,102,193,563,-247,-449,-385,-371,132,314,232,233,-53,247,745,-18,-236,-171,-154,316,504,411,327,49,1,-2,-20,-5,-6,-9,-9,-11,-7,-1,5,8425,8594,8968,8832,8445,8313,8313,8309,8315,8314,8315,8316,11.728840538,11.695317509,11.591675192,11.871904166,11.659872338,11.503136763,10.794700662,11.164793684,11.154375093,11.031990788,9.455913993,9.5402102069,10.209797246,10.195081544,10.352411093,9.843580092,10.534667725,10.845799579,10.882640465,10.859926145,2.2729265447,2.1551073022,1.3818779453,1.6768226223,1.3074612455,1.6595566708,0.2600329375,0.3189941053,0.2717346279,0.1720646434,1.2275152259,1.5374441502,1.4288349629,1.4353601647,1.4549696937,1.2312839816,1.2668271314,1.1895821842,0.6230013421,0.6750228317,3.7972036933,-1.658291289,-3.011957269,-2.582306838,-2.487528831,0.8833124216,2.0935985225,1.5418048421,1.5442480076,-0.350747158,5.0247189192,-0.120847138,-1.583122306,-1.146946674,-1.032559137,2.1145964032,3.3604256539,2.7313870262,2.1672493497,0.324275674 +050,3,5,24,045,Maryland,Wicomico County,98733,98734,98974,100086,100593,100890,101416,101820,102246,102471,103398,104005,103990,240,1112,507,297,526,404,426,225,927,607,-15,327,1284,1228,1198,1213,1199,1313,1210,1260,1269,1253,153,872,891,917,948,915,1005,985,1018,1076,1140,174,412,337,281,265,284,308,225,242,193,113,113,435,421,355,331,330,312,337,285,236,191,-38,266,-241,-331,-49,-201,-191,-334,401,176,-324,75,701,180,24,282,129,121,3,686,412,-133,-9,-1,-10,-8,-21,-9,-3,-3,-1,2,5,4403,4422,4955,4734,4831,4885,4882,4885,4878,4884,4874,4876,12.900632975,12.238450461,11.891822139,11.991735292,11.799090712,12.868385718,11.821197067,12.240793903,12.237045752,12.048366547,8.7611775344,8.8798528994,9.102504926,9.3719415143,9.00431026,9.8497544912,9.6230405877,9.8897842803,10.375934774,10.961801966,4.1394554406,3.3585975613,2.7893172129,2.6197937777,2.7947804523,3.0186312272,2.1981564794,2.3510096226,1.8611109772,1.0865645809,4.3705415453,4.1957554104,3.5238705002,3.2722707186,3.2474561593,3.0578342301,3.292349927,2.7687510019,2.2757626457,1.8365826102,2.6725610369,-2.401845734,-3.285637002,-0.484414699,-1.977996024,-1.871943391,-3.263041174,3.8956812342,1.6971789222,-3.115459506,7.0431025821,1.7939096766,0.2382334986,2.7878560201,1.269460135,1.1858908392,0.0293087531,6.664432236,3.9729415679,-1.278876896 +050,3,5,24,047,Maryland,Worcester County,51454,51448,51500,51504,51578,51551,51581,51472,51508,51721,51940,52261,52403,52,4,74,-27,30,-109,36,213,219,321,142,112,438,462,422,437,439,428,423,414,393,409,118,604,590,599,584,656,643,638,662,663,754,-6,-166,-128,-177,-147,-217,-215,-215,-248,-270,-345,19,44,25,48,43,59,51,61,35,35,33,48,128,183,110,138,57,203,370,431,560,457,67,172,208,158,181,116,254,431,466,595,490,-9,-2,-6,-8,-4,-8,-3,-3,1,-4,-3,735,735,730,733,720,722,722,722,723,723,725,723,8.5045240962,8.963737607,8.1839249872,8.4745762712,8.5198878247,8.3122936493,8.1953714557,7.9875748835,7.5431137897,7.8154857449,11.727699895,11.447197377,11.616519117,11.325291859,12.731313014,12.487861721,12.360867586,12.77240235,12.725405706,14.408010395,-3.223175799,-2.48345977,-3.43259413,-2.850715588,-4.211425189,-4.175568071,-4.16549613,-4.784827466,-5.182291917,-6.59252465,0.854335754,0.4850507363,0.9308729843,0.833882791,1.1450418717,0.990483589,1.1818384369,0.6752780699,0.6717785818,0.6305893144,2.4853403751,3.5505713898,2.1332505891,2.6761819804,1.106226893,3.9425131093,7.1685282237,8.3155670889,10.748457308,8.7327065658,3.3396761291,4.0356221261,3.0641235734,3.5100647714,2.2512687646,4.9329966984,8.3503666605,8.9908451587,11.42023589,9.3632958801 +050,3,5,24,510,Maryland,Baltimore city,620961,620777,620942,620493,623035,622591,623833,622831,616542,610853,603241,594601,586131,165,-449,2542,-444,1242,-1002,-6289,-5689,-7612,-8640,-8470,2115,8949,9008,9008,8741,8928,8562,8266,7796,7678,7468,1429,6269,6073,6407,6166,6319,6479,6664,6744,6780,7266,686,2680,2935,2601,2575,2609,2083,1602,1052,898,202,555,1779,2101,1694,1990,2289,1864,1964,1498,1354,1091,-1016,-4915,-2390,-4690,-3204,-5880,-10248,-9241,-10149,-10854,-9720,-461,-3136,-289,-2996,-1214,-3591,-8384,-7277,-8651,-9500,-8629,-60,7,-104,-49,-119,-20,12,-14,-13,-38,-43,25229,25461,25502,25296,25215,26664,26673,26630,26619,26610,26583,26570,14.417186562,14.487812096,14.463410366,14.025724793,14.32302529,13.816663749,13.469176589,12.842498192,12.819720798,12.649779967,10.099602476,9.7673715429,10.28719696,9.8939044819,10.137454839,10.455286665,10.858769997,11.109518703,11.320357777,12.307619341,4.3175840862,4.720440553,4.176213406,4.1318203115,4.1855704504,3.3613770834,2.6104065928,1.7329794892,1.4993630212,0.3421606258,2.866038093,3.3790956054,2.7199175354,3.1931349204,3.6722003683,3.0079725797,3.2002737505,2.4676837214,2.2607322168,1.8480061521,-7.918255889,-3.843902188,-7.530350201,-5.141107681,-9.433175258,-16.53739431,-15.05790719,-16.71863958,-18.12259046,-16.46436279,-5.052217796,-0.464806583,-4.810432666,-1.94797276,-5.76097489,-13.52942173,-11.85763344,-14.25095586,-15.86185824,-14.61635663 +040,1,1,25,000,Massachusetts,Massachusetts,6547629,6547788,6566440,6614218,6664269,6715158,6764864,6797484,6827280,6863560,6885720,6894883,6893574,18652,47778,50051,50889,49706,32620,29796,36280,22160,9163,-1309,18641,73187,72228,72160,71952,71930,71345,70774,70453,68720,68502,12304,53996,52396,54782,54729,57488,55985,58151,58914,59297,63072,6337,19191,19832,17378,17223,14442,15360,12623,11539,9423,5430,9025,34360,38843,37447,44485,40816,44834,48583,37740,30022,25247,3545,-5601,-7714,-3074,-10847,-22139,-30252,-24724,-27035,-30338,-32164,12570,28759,31129,34373,33638,18677,14582,23859,10705,-316,-6917,-255,-172,-910,-862,-1155,-499,-146,-202,-84,56,178,239070,245193,246715,247567,247190,252670,252422,250514,248957,247063,247509,247482,11.105211895,10.87895029,10.786710074,10.675353497,10.60730782,10.472841952,10.338883516,10.248245726,9.973438753,9.9361371617,8.1932176679,7.8918629811,8.1889904553,8.1200164213,8.4775880991,8.2181239983,8.4948768666,8.5697578346,8.6058643443,9.1485218397,2.9119942267,2.987087309,2.5977196183,2.5553370759,2.1297197211,2.2547179533,1.8440066497,1.6784878917,1.3675744088,0.787615322,5.2137002568,5.8505159511,5.5976986159,6.6001375962,6.0190167661,6.5812516092,7.0971540095,5.4897420083,4.3571387986,3.6620486252,-0.849881698,-1.161879362,-0.459511457,-1.609344554,-3.264773917,-4.440737469,-3.611757935,-3.93256956,-4.403000362,-4.665351605,4.363818559,4.6886365894,5.1381871585,4.9907930417,2.7542428494,2.1405141403,3.485396075,1.5571724483,-0.045861564,-1.00330298 +050,1,1,25,001,Massachusetts,Barnstable County,215888,215883,215909,215389,214854,214609,214398,214015,213805,213856,213779,212923,213164,26,-520,-535,-245,-211,-383,-210,51,-77,-856,241,445,1650,1592,1542,1549,1483,1566,1556,1541,1479,1459,707,2868,2683,2884,2859,3004,2898,3041,2899,3004,3077,-262,-1218,-1091,-1342,-1310,-1521,-1332,-1485,-1358,-1525,-1618,105,236,377,249,362,439,496,541,396,343,277,201,475,236,865,766,723,644,1012,897,335,1593,306,711,613,1114,1128,1162,1140,1553,1293,678,1870,-18,-13,-57,-17,-29,-24,-18,-17,-12,-9,-11,3961,3937,3939,3976,3981,3954,4142,4133,4117,4133,4111,4112,7.6513222876,7.4004690373,7.1810609994,7.2213273909,6.9232259525,7.3208358656,7.2767916644,7.2070808049,6.932238424,6.8483666481,13.299389285,12.472021625,13.430726279,13.328453848,14.023850817,13.547753728,14.221544635,13.558291534,14.080083993,14.443059751,-5.648066998,-5.071552588,-6.24966528,-6.107126457,-7.100624864,-6.226917863,-6.94475297,-6.351210729,-7.147845569,-7.594693103,1.0943709454,1.7524980069,1.1595876711,1.6876181508,2.0494242705,2.3187321771,2.5300413178,1.8520467221,1.6076793641,1.300203949,2.2026533858,1.0970544553,4.028286488,3.5710373024,3.3752477166,3.0106119396,4.7327205427,4.1951664387,1.5701824693,7.4773461758,3.2970243312,2.8495524622,5.1878741591,5.2586554532,5.4246719871,5.3293441167,7.2627618604,6.0472131608,3.1778618333,8.7775501247 +050,1,1,25,003,Massachusetts,Berkshire County,131219,131274,131318,130565,130321,129542,128928,127950,127182,126518,126146,125217,124571,44,-753,-244,-779,-614,-978,-768,-664,-372,-929,-646,263,1187,1185,1066,1102,1078,1008,994,1024,975,975,289,1429,1399,1566,1460,1483,1507,1525,1602,1480,1494,-26,-242,-214,-500,-358,-405,-499,-531,-578,-505,-519,52,181,286,278,320,337,333,360,304,178,174,38,-691,-300,-551,-565,-909,-596,-490,-91,-601,-303,90,-510,-14,-273,-245,-572,-263,-130,213,-423,-129,-20,-1,-16,-6,-11,-1,-6,-3,-7,-1,2,6212,6293,6141,6126,6026,6039,5898,5917,5884,5815,5790,5794,9.0651168652,9.0844276811,8.2043230471,8.5271017913,8.3930893265,7.9017920135,7.8360268033,8.1056264446,7.7577049924,7.8066200138,10.91327043,10.724990992,12.052504589,11.297249197,11.546337172,11.813492623,12.022073315,12.680872621,11.775798347,11.962143898,-1.848153565,-1.640563311,-3.848181542,-2.770147406,-3.153247845,-3.91170061,-4.186046512,-4.575246177,-4.018093355,-4.155523884,1.3822966745,2.1925285374,2.1395889372,2.4761094131,2.6238136392,2.610413433,2.837997635,2.4063578507,1.4162784499,1.3931814178,-5.277165757,-2.299855109,-4.240696059,-4.371880682,-7.077289608,-4.67209131,-3.862830114,-0.720324225,-4.781928924,-2.426057297,-3.894869083,-0.107326572,-2.101107122,-1.895771269,-4.453475969,-2.061677877,-1.024832479,1.6860336257,-3.365650474,-1.032875879 +050,1,1,25,005,Massachusetts,Bristol County,548285,548239,549175,549355,551204,552495,555212,557104,558413,561449,564780,565096,566765,936,180,1849,1291,2717,1892,1309,3036,3331,316,1669,1478,5826,5802,5647,5558,5662,5663,5590,5740,5503,5442,1088,5108,4921,5132,5194,5427,5237,5505,5643,5466,5745,390,718,881,515,364,235,426,85,97,37,-303,177,874,1088,1125,1438,1533,1823,2003,1836,932,951,391,-1401,-1,-271,1036,202,-919,988,1418,-662,997,568,-527,1087,854,2474,1735,904,2991,3254,270,1948,-22,-11,-119,-78,-121,-78,-21,-40,-20,9,24,15868,16537,16356,16635,16082,16461,16379,15837,15549,15539,14986,14999,10.606901951,10.543732776,10.232862402,10.035144673,10.180560201,10.153139755,9.9833729513,10.193308821,9.7408919209,9.6160217553,9.2997005089,8.9427281954,9.2996369481,9.3779311677,9.7580184048,9.3893683377,9.8315685326,10.021052557,9.6753980083,10.151423187,1.3072014419,1.6010045804,0.9332254537,0.657213505,0.4225417957,0.7637714172,0.1518044188,0.172256264,0.0654939126,-0.535401432,1.5912173541,1.9771770528,2.038599292,2.5963544511,2.756410948,3.2684396562,3.5772264797,3.2604381525,1.6497385554,1.6804183553,-2.550681365,-0.001817258,-0.491075918,1.870530745,0.3632061393,-1.647666508,1.7645031263,2.5181379631,-1.171810004,1.7617004208,-0.959464011,1.9753597944,1.5475233737,4.4668851962,3.1196170872,1.6207731482,5.341729606,5.7785761155,0.4779285515,3.4421187761 +050,1,1,25,007,Massachusetts,Dukes County,16535,16535,16573,16706,16838,17173,17312,17290,17349,17422,17459,17461,17461,38,133,132,335,139,-22,59,73,37,2,0,42,174,151,161,153,173,133,193,165,170,166,19,146,134,146,142,138,152,158,154,146,148,23,28,17,15,11,35,-19,35,11,24,18,6,5,-4,0,1,1,44,51,38,39,31,12,99,122,312,126,-58,36,-11,-11,-60,-50,18,104,118,312,127,-57,80,40,27,-21,-19,-3,1,-3,8,1,0,-2,-2,-1,-1,1,143,143,142,142,137,140,105,141,142,140,122,119,10.457044983,9.0031004054,9.4675252124,8.8734232275,9.9994219987,7.6792055198,11.101205027,9.4607379376,9.7365406644,9.5069010939,8.7743021124,7.9895063201,8.5854576461,8.2354646948,7.9764175481,8.7762348798,9.0880331311,8.8300220751,8.3619702176,8.4760323006,1.6827428709,1.0135940854,0.8820675664,0.6379585327,2.0230044506,-1.09702936,2.0131718961,0.6307158625,1.3745704467,1.0308687933,0.3004897984,-0.238492726,0,0.0579962302,0.0578001272,2.5404890441,2.9334790486,2.1788366159,2.2336769759,1.775385144,5.9496980078,7.2740281421,18.347005381,7.3075250109,-3.352407375,2.0785819452,-0.632711167,-0.630715863,-3.436426117,-2.863524426,6.2501878061,7.0355354162,18.347005381,7.3655212411,-3.294607248,4.6190709893,2.3007678813,1.5481207534,-1.202749141,-1.088139282 +050,1,1,25,009,Massachusetts,Essex County,743159,743082,745469,751553,757409,764684,771803,777228,780222,785156,788823,789725,791263,2387,6084,5856,7275,7119,5425,2994,4934,3667,902,1538,2178,8483,8349,8365,8419,8550,8433,8507,8617,8333,8291,1390,6275,6140,6363,6420,6837,6548,6879,7227,6956,7321,788,2208,2209,2002,1999,1713,1885,1628,1390,1377,970,969,3563,4248,4265,4993,4622,4950,5598,4568,3669,3052,645,347,-458,1114,315,-822,-3825,-2273,-2285,-4161,-2518,1614,3910,3790,5379,5308,3800,1125,3325,2283,-492,534,-15,-34,-143,-106,-188,-88,-16,-19,-6,17,34,16472,17035,17320,17635,18017,19039,19592,19498,19627,19477,19414,19420,11.33316678,11.065885026,10.991444018,10.958765027,11.03915932,10.829240104,10.868940282,10.949320162,10.557803754,10.488378153,8.3833103321,8.1380445631,8.3608557427,8.3567254393,8.8274540664,8.408616649,8.7889314913,9.1830958355,8.8131624759,9.261297366,2.9498564483,2.9278404625,2.6305882755,2.6020395877,2.2117052532,2.420623455,2.0800087902,1.766224327,1.7446412779,1.2270807875,4.7601170858,5.630360473,5.6041253721,6.4992414514,5.9676016813,6.3565443513,7.152266098,5.8043976444,4.6485757798,3.8608768694,0.4635870415,-0.607039806,1.4637738956,0.4100262482,-1.06130865,-4.911875181,-2.904090897,-2.903469487,-5.271933448,-3.18534992,5.2237041273,5.0233206668,7.0678992677,6.9092676996,4.9062930309,1.4446691708,4.2481752011,2.9009281572,-0.623357668,0.675526949 +050,1,1,25,011,Massachusetts,Franklin County,71372,71381,71372,71711,71714,71399,71344,70911,70706,70674,70722,70276,70267,-9,339,3,-315,-55,-433,-205,-32,48,-446,-9,154,635,676,621,587,600,615,587,505,473,461,144,670,643,692,708,727,694,745,721,707,774,10,-35,33,-71,-121,-127,-79,-158,-216,-234,-313,34,114,169,178,231,154,168,186,156,118,104,-50,262,-188,-424,-151,-458,-292,-54,113,-331,202,-16,376,-19,-246,80,-304,-124,132,269,-213,306,-3,-2,-11,2,-14,-2,-2,-6,-5,1,-2,1481,1478,1576,1602,1503,1682,1589,1558,1514,1515,1495,1496,8.875967096,9.4265295451,8.6784568837,8.2245714326,8.435555868,8.6853979395,8.3038619324,7.1430592096,6.7093150257,6.5602698107,9.3651936289,8.9663587241,9.6706798125,9.9199260209,10.22108186,9.8010832033,10.538972981,10.198308297,10.028511043,11.014422632,-0.489226533,0.460170821,-0.992222929,-1.695354588,-1.785525992,-1.115685264,-2.235111048,-3.055249088,-3.319196017,-4.454152822,1.593480707,2.3566323863,2.4875448073,3.2365860322,2.1651260061,2.3725965103,2.631206677,2.2065687855,1.6737826068,1.4799741005,3.6622100459,-2.621579223,-5.925387631,-2.115690437,-6.439140979,-4.123798696,-0.763898713,1.5983479023,-4.695102058,2.8745650797,5.2556907529,-0.264946836,-3.437842824,1.1208955956,-4.274014973,-1.751202186,1.8673079644,3.8049166879,-3.021319451,4.3545391802 +050,1,1,25,013,Massachusetts,Hampden County,463490,463620,464248,466191,467009,467828,469561,469251,467874,467552,468075,465749,463986,628,1943,818,819,1733,-310,-1377,-322,523,-2326,-1763,1328,5536,5427,5363,5331,5178,5025,4938,5034,4846,4843,1071,4231,4197,4444,4353,4461,4322,4653,4696,4571,4654,257,1305,1230,919,978,717,703,285,338,275,189,582,2744,2772,2447,2726,2480,2406,2541,3205,327,961,-147,-2103,-3213,-2539,-1918,-3513,-4496,-3155,-3030,-2937,-2925,435,641,-441,-92,808,-1033,-2090,-614,175,-2610,-1964,-64,-3,29,-8,-53,6,10,7,10,9,12,14926,15274,15579,15699,15280,16172,15835,15382,15185,14575,14453,14454,11.899759146,11.630947278,11.473657975,11.374146699,11.030962536,10.724289716,10.557756573,10.760698441,10.378829415,10.41802234,9.0946316739,8.9948564081,9.5075398171,9.28749964,9.5035001683,9.2239562492,9.9484085326,10.038188295,9.7898533342,10.011454877,2.8051274721,2.6360908701,1.9661181575,2.086647059,1.5274623673,1.5003334667,0.6093480404,0.7225101456,0.5889760811,0.4065674628,5.8982910218,5.9408486927,5.2351372485,5.8161552995,5.2832729023,5.1348539416,5.432818844,6.8510207593,0.7003461038,2.0672557234,-4.5204468,-6.885983712,-5.431963005,-4.092217852,-7.483926494,-9.595304789,-6.74558971,-6.476940063,-6.290264547,-6.292115495,1.3778442219,-0.945135019,-0.196825757,1.7239374475,-2.200653592,-4.460450847,-1.312770866,0.3740806967,-5.589918443,-4.224859772 +050,1,1,25,015,Massachusetts,Hampshire County,158080,158058,159331,160192,160497,160969,161060,160885,161613,161070,161126,161596,161401,1273,861,305,472,91,-175,728,-543,56,470,-195,302,1123,1124,1088,1111,1046,1011,990,984,974,932,270,1201,1148,1279,1243,1268,1194,1271,1318,1345,1404,32,-78,-24,-191,-132,-222,-183,-281,-334,-371,-472,189,706,731,751,790,661,779,817,584,546,432,932,234,-388,-69,-554,-613,138,-1087,-193,293,-159,1121,940,343,682,236,48,917,-270,391,839,273,120,-1,-14,-19,-13,-1,-6,8,-1,2,4,20832,22013,22287,22093,22472,22612,22563,22684,22063,22325,23014,23014,7.0292279429,7.0099067944,6.7689895665,6.8999996895,6.4980043175,6.2698063244,6.1360530304,6.1080832785,6.0361549569,5.770951433,7.5174557074,7.1595845196,7.9572956394,7.7198016328,7.8771218686,7.4046970834,7.8777004057,8.1813554482,8.3353474507,8.6935791973,-0.488227765,-0.149677725,-1.188306073,-0.819801943,-1.379117551,-1.134890759,-1.741647375,-2.07327217,-2.299192494,-2.922627764,4.4190872019,4.5589340451,4.6723448203,4.9063904183,4.1062914473,4.8310377119,5.0637932584,3.6251225962,3.3837172551,2.6749474453,1.4646832935,-2.41978989,-0.429283346,-3.440683914,-3.808103869,0.8558192609,-6.737262267,-1.198028529,1.8158043145,-0.984529268,5.8837704954,2.1391441552,4.2430614746,1.4657065047,0.2981875786,5.6868569728,-1.673469008,2.427094067,5.1995215696,1.6904181773 +050,1,1,25,017,Massachusetts,Middlesex County,1503085,1503107,1507694,1524996,1543163,1560625,1575520,1586107,1595581,1604762,1608509,1611263,1609379,4587,17302,18167,17462,14895,10587,9474,9181,3747,2754,-1884,4696,17637,17368,17640,17657,17507,17147,17076,16674,16512,16438,2525,11054,10690,10877,10996,11465,11328,11607,11688,12030,13015,2171,6583,6678,6763,6661,6042,5819,5469,4986,4482,3423,2863,10660,11845,11115,13098,11813,13271,14052,9733,9400,7426,-247,107,-35,-154,-4615,-7156,-9606,-10340,-10994,-11160,-12784,2616,10767,11810,10961,8483,4657,3665,3712,-1261,-1760,-5358,-200,-48,-321,-262,-249,-112,-10,0,22,32,51,55412,55641,55988,55898,56300,56970,57001,56699,56533,55399,55035,54996,11.631258058,11.321447161,11.366755719,11.260321191,11.07467769,10.778555283,10.671356164,10.378209619,10.256626867,10.207902648,7.2898977475,6.9683481202,7.0088549862,7.0124308666,7.2525949456,7.1207484832,7.253597505,7.2748299163,7.4725788037,8.0822395038,4.3413603105,4.3530990408,4.3579007329,4.2478903239,3.8220827441,3.6578067994,3.417758659,3.1033797025,2.784048063,2.1256631442,7.0300624198,7.7212426084,7.1622159761,8.3529301101,7.472734766,8.3421127402,8.7815587267,6.0580013326,5.838922756,4.611502924,0.0705644164,-0.022814984,-0.099233582,-2.943103715,-4.526783204,-6.038304196,-6.461807375,-6.84287133,-6.932167868,-7.938789844,7.1006268362,7.6984276239,7.0629823944,5.4098263951,2.9459515623,2.3038085444,2.3197513517,-0.784869997,-1.093245112,-3.32728692 +050,1,1,25,019,Massachusetts,Nantucket County,10172,10168,10165,10133,10313,10564,10833,10933,11081,11156,11118,11330,11376,-3,-32,180,251,269,100,148,75,-38,212,46,45,134,136,147,122,141,170,148,152,154,158,9,66,70,38,70,80,69,68,77,63,61,36,68,66,109,52,61,101,80,75,91,97,18,53,55,84,98,75,57,55,38,42,33,-60,-156,59,55,115,-35,-11,-58,-152,79,-84,-42,-103,114,139,213,40,46,-3,-114,121,-51,3,3,0,3,4,-1,1,-2,1,0,0,58,60,60,60,58,57,59,60,56,56,55,55,13.203271258,13.303335616,14.082483115,11.403467776,12.955986401,15.444716998,13.311148087,13.648199695,13.720598717,13.917026337,6.5031037541,6.8473050964,3.6403697849,6.542973314,7.35091427,6.2687380758,6.1159329046,6.9138906348,5.6129722024,5.3730291553,6.7001675042,6.4560305194,10.44211333,4.8604944618,5.6050721308,9.1759789225,7.1952151819,6.7343090599,8.1076265146,8.5439971814,5.2221893783,5.3800254328,8.0471332088,9.1601626396,6.8914821281,5.1785227582,4.9467104376,3.4120499237,3.7419814683,2.9067206906,-15.37097251,5.7713000098,5.2689562677,10.749170444,-3.216024993,-0.999364041,-5.216531007,-13.64819969,7.0384889522,-7.398925394,-10.14878313,11.151325443,13.316089476,19.909333084,3.675457135,4.1791587172,-0.269820569,-10.23614977,10.780470421,-4.492204704 +050,1,1,25,021,Massachusetts,Norfolk County,670850,670951,673059,677823,682984,688518,692439,694774,697452,701046,703628,707164,709409,2108,4764,5161,5534,3921,2335,2678,3594,2582,3536,2245,1891,7121,7240,7179,7248,7337,7235,7171,7222,7044,7058,1322,5494,5387,5688,5643,5954,5754,5970,5805,6011,6404,569,1627,1853,1491,1605,1383,1481,1201,1417,1033,654,693,2738,3216,2995,3877,3432,4055,4292,2769,2871,2243,859,431,256,1163,-1451,-2448,-2846,-1878,-1590,-374,-689,1552,3169,3472,4158,2426,984,1209,2414,1179,2497,1554,-13,-32,-164,-115,-110,-32,-12,-21,-14,6,37,17545,17976,18333,18198,18057,17812,17499,17379,17005,16581,16595,16580,10.542741705,10.640744793,10.468814482,10.497068337,10.578043891,10.393427504,10.255288173,10.282812952,9.9858802715,9.9648941495,8.1339450818,7.9173608013,8.2945558957,8.1725933537,8.5841179401,8.2658993583,8.5377311945,8.265262972,8.5214546156,9.0415389818,2.4087966232,2.723383992,2.1742585866,2.3244749837,1.9939259508,2.1275281456,1.717556979,2.0175499796,1.4644256559,0.9233551677,4.053647913,4.7266070795,4.3674744915,5.6149467362,4.9480505157,5.8252036666,6.1380137834,3.9425517949,4.0700542674,3.1667976165,0.6381016255,0.3762473297,1.6959508626,-2.101441247,-3.52937869,-4.088416679,-2.685738557,-2.263870478,-0.53019864,-0.9727702,4.6917495384,5.1028544092,6.0634253541,3.5135054893,1.4186718262,1.7367869872,3.4522752267,1.6786813168,3.5398556272,2.1940274169 +050,1,1,25,023,Massachusetts,Plymouth County,494919,494933,495937,498212,499545,502895,506634,509413,512535,515984,518888,521841,523738,1004,2275,1333,3350,3739,2779,3122,3449,2904,2953,1897,1292,5180,4914,5181,5129,5243,5218,5121,5182,5013,5023,955,4222,3983,4230,4374,4663,4583,4794,4719,4855,5223,337,958,931,951,755,580,635,327,463,158,-200,352,1152,1362,1268,1456,1506,1843,1995,1509,1487,1142,357,182,-909,1217,1619,761,679,1165,959,1312,933,709,1334,453,2485,3075,2267,2522,3160,2468,2799,2075,-42,-17,-51,-86,-91,-68,-35,-38,-27,-4,22,11821,11974,12357,12098,12036,12412,12186,11695,11503,11227,11380,11383,10.420973114,9.8500937603,10.336778261,10.161174171,10.320388722,10.21186988,9.9580075818,10.014765111,9.63363181,9.6080736128,8.4936966189,7.9839079054,8.4394078449,8.6654271447,9.1787092526,8.9691452011,9.322141837,9.1199684599,9.3299984914,9.9906367668,1.9272764948,1.8661858549,1.8973704162,1.4957470266,1.1416794696,1.2427246788,0.6358657448,0.8947966512,0.3036333186,-0.382563154,2.3175600438,2.7301236674,2.5298272216,2.8845134711,2.9644297951,3.6068371385,3.8793644065,2.9163026925,2.8576123083,2.1844356094,0.3661422986,-1.822086941,2.4280754958,3.2074363391,1.4979622006,1.3288347352,2.2653932499,1.8533693056,2.521309582,1.7846571134,2.6837023424,0.9080367264,4.9579027174,6.0919498103,4.4623919956,4.9356718737,6.1447576564,4.7696719981,5.3789218903,3.9690927228 +050,1,1,25,025,Massachusetts,Suffolk County,722023,722172,725786,737285,751371,762863,774113,783177,793020,801269,804023,805915,801582,3614,11499,14086,11492,11250,9064,9843,8249,2754,1892,-4333,2264,9696,9550,9578,9273,9482,9434,9318,9053,8987,8976,1031,4633,4509,4663,4542,4768,4677,4679,4833,5222,5967,1233,5063,5041,4915,4731,4714,4757,4639,4220,3765,3009,2197,8183,9117,9308,10942,10035,10711,11678,8705,7928,6332,127,-1751,-90,-2643,-4282,-5639,-5601,-8033,-10154,-9771,-13632,2324,6432,9027,6665,6660,4396,5110,3645,-1449,-1843,-7300,57,4,18,-88,-141,-46,-24,-35,-17,-30,-42,47294,48940,48242,49357,49128,50510,50759,51020,51426,52130,53255,53252,13.254312333,12.830365108,12.65062071,12.066551462,12.177564872,11.970584895,11.689223221,11.27894489,11.164405089,11.167672475,6.3332538202,6.0578132221,6.1588895772,5.9103069924,6.1234580586,5.9345373706,5.8697011646,6.0213344364,6.4872063396,7.4239640883,6.9210585132,6.7725518857,6.4917311327,6.1562444697,6.0541068138,6.0360475245,5.8195220565,5.2576104534,4.6771987493,3.7437083864,11.186060007,12.248632323,12.294004758,14.238348549,12.88777299,13.590940726,14.649790596,10.845378909,9.8488264765,7.8780862422,-2.393595389,-0.120914436,-3.490873934,-5.571980304,-7.242067951,-7.106979648,-10.07721937,-12.65065795,-12.13835564,-16.96052932,8.7924646172,12.127717888,8.8031308239,8.6663682452,5.6457050389,6.4839610785,4.5725712214,-1.80527904,-2.289529162,-9.082443078 +050,1,1,25,027,Massachusetts,Worcester County,798552,798385,800404,804107,807047,810994,815707,818446,820447,825646,828644,829327,829212,2019,3703,2940,3947,4713,2739,2001,5199,2998,683,-115,2263,8805,8714,8582,8713,8450,8687,8585,8560,8257,8280,1484,6599,6492,6780,6725,7213,7022,7256,7532,7441,7785,779,2206,2222,1802,1988,1237,1665,1329,1028,816,495,788,3151,3581,3384,4153,3728,3898,4414,3899,2142,2089,487,-1636,-2805,-1149,-1288,-2174,-3557,-510,-1922,-2300,-2745,1275,1515,776,2235,2865,1554,341,3904,1977,-158,-656,-35,-18,-58,-90,-140,-52,-5,-34,-7,25,46,27045,27892,28395,28048,28113,28810,28815,28511,28353,28151,27804,27808,10.975306495,10.817091352,10.607889417,10.712478814,10.341748906,10.601058153,10.43075938,10.348850564,9.9603672199,9.9846913458,8.2255590644,8.0588199514,8.3805045731,8.2682681083,8.8278147762,8.5691988434,8.816026798,9.1060213143,8.976031547,9.3877804501,2.7497474308,2.7582714005,2.2273848438,2.4442107062,1.5139341298,2.0318593099,1.6147325819,1.24282925,0.9843356729,0.5969108957,3.9276764073,4.4452609744,4.1828359108,5.1060397701,4.5626082747,4.7568694234,5.3630019689,4.7138047138,2.5838811415,2.5190845678,-2.039250588,-3.481976273,-1.420235952,-1.583573134,-2.660705577,-4.340734874,-0.619649072,-2.323655465,-2.774475549,-3.31014224,1.8884258195,0.9632847015,2.7625999588,3.5224666365,1.9019026982,0.4161345494,4.7433528968,2.3901492483,-0.190594407,-0.791057672 +040,2,3,26,000,Michigan,Michigan,9883640,9884112,9877597,9883053,9898289,9914802,9932033,9934483,9954117,9976752,9987286,9984795,9966555,-6515,5456,15236,16513,17231,2450,19634,22635,10534,-2491,-18240,29099,113968,113055,113013,114514,113815,113522,112243,111032,109251,108474,22115,89827,89045,92319,91841,96306,94757,97489,98542,97215,103445,6984,24141,24010,20694,22673,17509,18765,14754,12490,12036,5029,4691,22175,24499,23793,23685,21766,28244,21372,14012,9228,7753,-18665,-40909,-32995,-28223,-28543,-36375,-27108,-13174,-15834,-23878,-31206,-13974,-18734,-8496,-4430,-4858,-14609,1136,8198,-1822,-14650,-23453,475,49,-278,249,-584,-450,-267,-317,-134,123,184,229500,228925,226967,227988,227686,228707,231516,230924,229523,226181,223469,218618,11.534843236,11.430468165,11.407912072,11.539774478,11.457972802,11.415785928,11.263231924,11.123200627,10.940372213,10.873850642,9.0915025568,9.0029281128,9.3189901566,9.2549769271,9.6953084275,9.5287752783,9.7827144416,9.8719507547,9.7350896985,10.369724354,2.4433406796,2.4275400526,2.0889219153,2.2847975508,1.7626643746,1.8870106493,1.4805174827,1.2512498724,1.2052825141,0.5041262872,2.2443593708,2.476980581,2.4017453915,2.3867785468,2.1912246717,2.8402200255,2.1446129619,1.4037240362,0.9240899834,0.7771905159,-4.140450845,-3.335971847,-2.848924481,-2.876327636,-3.661940523,-2.725983729,-1.321969454,-1.58625224,-2.391137909,-3.128209369,-1.896091475,-0.858991266,-0.44717909,-0.489549089,-1.470715852,0.1142362962,0.8226435084,-0.182528204,-1.467047926,-2.351018853 +050,2,3,26,001,Michigan,Alcona County,10942,10943,10879,10742,10571,10550,10447,10327,10355,10305,10364,10453,10505,-64,-137,-171,-21,-103,-120,28,-50,59,89,52,20,60,58,65,66,52,58,67,51,72,82,65,176,200,182,179,198,183,192,163,174,180,-45,-116,-142,-117,-113,-146,-125,-125,-112,-102,-98,0,2,5,4,2,1,2,1,1,1,1,-17,-22,-32,91,8,25,149,73,171,192,150,-17,-20,-27,95,10,26,151,74,172,193,151,-2,-1,-2,1,0,0,2,1,-1,-2,-1,127,127,127,127,127,127,127,127,127,127,127,127,5.5501595671,5.4426875616,6.1550115998,6.2866123732,5.0062578223,5.6087419012,6.4859632139,4.9349267018,6.9174232598,7.8251741578,16.280468063,18.767888143,17.23403248,17.05005477,19.0622894,17.696547723,18.586640852,15.772412792,16.717106211,17.177211566,-10.7303085,-13.32520058,-11.07902088,-10.7634424,-14.05603158,-12.08780582,-12.10067764,-10.83748609,-9.799682951,-9.352037408,0.1850053189,0.4691972036,0.3787699446,0.1905034052,0.0962741889,0.1934048931,0.0968054211,0.0967632687,0.0960753231,0.0954289531,-2.035058508,-3.002862103,8.6170162398,0.762013621,2.4068547222,14.408664539,7.0667957406,16.546518941,18.446462026,14.314342972,-1.850053189,-2.533664899,8.9957861844,0.9525170262,2.5031289111,14.602069432,7.1636011617,16.64328221,18.542537349,14.409771925 +050,2,3,26,003,Michigan,Alger County,9601,9601,9578,9516,9456,9445,9370,9265,9138,9152,9105,9078,9015,-23,-62,-60,-11,-75,-105,-127,14,-47,-27,-63,13,53,61,59,61,59,61,64,57,58,57,15,97,121,104,117,138,117,114,112,109,114,-2,-44,-60,-45,-56,-79,-56,-50,-55,-51,-57,0,4,3,1,2,3,3,1,3,5,4,-21,-22,-1,32,-19,-28,-73,63,5,20,-9,-21,-18,2,33,-17,-25,-70,64,8,25,-5,0,0,-2,1,-2,-1,-1,0,0,-1,-1,1022,1022,1022,1039,1040,1048,1053,1058,1051,1051,1050,1021,5.551482141,6.4305292009,6.243055923,6.4841881478,6.3321706466,6.6293539097,6.9983597594,6.2441803144,6.379585327,6.3007793069,10.160259767,12.75563989,11.004708746,12.436885464,14.810839818,12.715318155,12.465828321,12.269266583,11.989220701,12.601558614,-4.608777626,-6.325110689,-4.761652823,-5.952697316,-8.478669171,-6.085964245,-5.467468562,-6.025086268,-5.609635374,-6.300779307,0.4189797842,0.3162555345,0.1058145072,0.2125963327,0.3219747786,0.3260337988,0.1093493712,0.3286410692,0.5499642523,0.4421599514,-2.304388813,-0.105418511,3.3860642294,-2.019665161,-3.005097934,-7.933489105,6.8890103882,0.5477351153,2.1998570093,-0.994859891,-1.885409029,0.210837023,3.4918787366,-1.807068828,-2.683123155,-7.607455306,6.9983597594,0.8763761845,2.7498212616,-0.552699939 +050,2,3,26,005,Michigan,Allegan County,111408,111398,111521,111167,111506,112020,113361,114122,115018,116393,117137,118045,118927,123,-354,339,514,1341,761,896,1375,744,908,882,339,1356,1348,1301,1367,1391,1399,1380,1336,1375,1423,192,908,915,929,918,1052,949,1045,988,1005,1021,147,448,433,372,449,339,450,335,348,370,402,25,58,74,77,66,41,102,57,45,42,38,-41,-862,-155,80,828,395,349,988,356,495,437,-16,-804,-81,157,894,436,451,1045,401,537,475,-8,2,-13,-15,-2,-14,-5,-5,-5,1,5,954,954,954,954,954,954,954,954,955,955,955,955,12.178473919,12.107440058,11.64070399,12.130570013,12.22948528,12.210875447,11.926831482,11.441784781,11.693071749,12.009857705,8.1549073143,8.2183291194,8.3122321341,8.1462057582,9.2490427856,8.2831456751,9.0315499263,8.4614396437,8.5465724418,8.6170518036,4.0235666044,3.8891109385,3.3284718556,3.9843642543,2.9804424946,3.9277297722,2.8952815553,2.9803451377,3.1464993069,3.3928059011,0.5209081765,0.6646517539,0.6889578841,0.5856749238,0.3604664964,0.890285415,0.492629996,0.3853894575,0.3571701916,0.3207129956,-7.741773243,-1.392175971,0.7158003991,7.3475581349,3.4727869775,3.0461726455,8.5389199303,3.048858819,4.2095058295,3.6881994497,-7.220865067,-0.727524217,1.4047582832,7.9332330587,3.8332534739,3.9364580606,9.0315499263,3.4342482765,4.5666760211,4.0089124454 +050,2,3,26,007,Michigan,Alpena County,29598,29594,29511,29342,29168,28964,28888,28728,28670,28434,28422,28391,28238,-83,-169,-174,-204,-76,-160,-58,-236,-12,-31,-153,66,280,243,257,275,275,259,273,292,235,233,113,363,368,372,332,368,382,406,392,362,365,-47,-83,-125,-115,-57,-93,-123,-133,-100,-127,-132,4,10,5,-1,5,9,15,10,8,7,3,-38,-96,-48,-85,-17,-73,53,-113,82,89,-24,-34,-86,-43,-86,-12,-64,68,-103,90,96,-21,-2,0,-6,-3,-7,-3,-3,0,-2,0,0,514,514,514,514,514,514,513,513,514,513,513,513,9.5152328683,8.3062724321,8.8419459162,9.5070179078,9.5459594557,9.0247046935,9.5615018212,10.271563248,8.2727544752,8.228999276,12.335819754,12.579046317,12.79845868,11.477563438,12.774229381,13.310568312,14.219669375,13.789221894,12.743562213,12.890921613,-2.820586886,-4.272773885,-3.956512764,-1.97054553,-3.228269925,-4.285863619,-4.658167554,-3.517658646,-4.470807738,-4.661922337,0.3398297453,0.1709109554,-0.034404459,0.1728548711,0.3124132186,0.522666295,0.350238162,0.2814126917,0.2464224737,0.1059527804,-3.262365555,-1.640745172,-2.924379,-0.587706562,-2.534018328,1.8467542423,-3.95769123,2.8844800901,3.1330857374,-0.847622243,-2.92253581,-1.469834216,-2.958783458,-0.414851691,-2.22160511,2.3694205373,-3.607453068,3.1658927818,3.3795082111,-0.741669463 +050,2,3,26,009,Michigan,Antrim County,23580,23577,23492,23324,23251,23128,23147,23036,23090,23267,23339,23359,23449,-85,-168,-73,-123,19,-111,54,177,72,20,90,40,210,204,156,224,209,214,154,183,162,186,81,265,243,261,282,290,267,260,285,273,300,-41,-55,-39,-105,-58,-81,-53,-106,-102,-111,-114,0,4,2,7,5,6,8,4,5,7,4,-43,-116,-30,-21,72,-33,99,279,169,125,204,-43,-112,-28,-14,77,-27,107,283,174,132,208,-1,-1,-6,-4,0,-3,0,0,0,-1,-4,226,226,226,226,226,226,226,226,226,226,226,226,8.971291866,8.7600644122,6.7271825611,9.6812533766,9.0509494836,9.2789316221,6.6440882715,7.8530661288,6.9381986381,7.9473594257,11.320915926,10.434782609,11.2550939,12.188006483,12.558733733,11.576984781,11.217291887,12.230184955,11.692149557,12.818321654,-2.34962406,-1.674718196,-4.527911339,-2.506753106,-3.50778425,-2.298053159,-4.573203615,-4.377118826,-4.753950919,-4.870962229,0.1708817498,0.0858829844,0.3018607559,0.2160994057,0.2598358703,0.3468759485,0.1725737213,0.2145646483,0.2997987066,0.1709109554,-4.955570745,-1.288244767,-0.905582268,3.1118314425,-1.429097287,4.2925898626,12.037017063,7.2522851135,5.3535483318,8.716458725,-4.784688995,-1.202361782,-0.603721512,3.3279308482,-1.169261417,4.639465811,12.209590785,7.4668497618,5.6533470384,8.8873696804 +050,2,3,26,011,Michigan,Arenac County,15899,15903,15852,15635,15500,15411,15317,15304,15126,15009,15033,14944,14953,-51,-217,-135,-89,-94,-13,-178,-117,24,-89,9,19,143,126,108,117,147,118,120,128,134,137,60,213,209,217,217,181,206,231,204,193,218,-41,-70,-83,-109,-100,-34,-88,-111,-76,-59,-81,0,2,2,-1,1,2,2,0,-1,-1,-1,-9,-147,-53,23,10,21,-92,-4,102,-28,92,-9,-145,-51,22,11,23,-90,-4,101,-29,91,-1,-2,-1,-2,-5,-2,0,-2,-1,-1,-1,207,207,207,207,207,207,207,207,207,207,207,207,9.083113666,8.0937851293,6.9878036945,7.6152043739,9.6012540413,7.7555044364,7.9641612743,8.5214033686,8.9401874771,9.1647991437,13.529393083,13.425405492,14.040309275,14.123926061,11.821952255,13.539270457,15.331010453,13.580986619,12.87653868,14.583403017,-4.446279417,-5.331620363,-7.052505581,-6.508721687,-2.220698214,-5.78376602,-7.366849179,-5.05958325,-3.936351203,-5.418603873,0.1270365548,0.1284727798,-0.064701886,0.0650872169,0.1306293067,0.1314492277,0,-0.066573464,-0.066717817,-0.066896344,-9.337186775,-3.404528665,1.4881433794,0.6508721687,1.3716077202,-6.046664476,-0.265472042,6.7904933094,-1.868098876,6.1544636586,-9.210150221,-3.276055886,1.4234414933,0.7159593856,1.5022370269,-5.915215248,-0.265472042,6.7239198455,-1.934816693,6.0875673144 +050,2,3,26,013,Michigan,Baraga County,8860,8866,8861,8835,8725,8716,8649,8583,8532,8433,8313,8245,8164,-5,-26,-110,-9,-67,-66,-51,-99,-120,-68,-81,22,79,88,73,77,80,60,72,62,60,70,11,113,120,89,110,94,102,110,111,104,125,11,-34,-32,-16,-33,-14,-42,-38,-49,-44,-55,0,7,4,5,5,6,2,2,0,0,0,-17,2,-83,2,-37,-57,-11,-62,-71,-24,-26,-17,9,-79,7,-32,-51,-9,-60,-71,-24,-26,1,-1,1,0,-2,-1,0,-1,0,0,0,1010,1010,1010,1010,1011,1027,1031,1010,1010,1010,1010,1011,8.9285714286,10.022779043,8.3710796399,8.8684134754,9.2850510678,7.0113935145,8.4880636605,7.4047533739,7.2472520836,8.5319032238,12.77124774,13.667425968,10.205836821,12.669162108,10.909935005,11.919368975,12.967875037,13.256897169,12.561903612,15.235541471,-3.842676311,-3.644646925,-1.834757181,-3.800748632,-1.624883937,-4.90797546,-4.479811376,-5.852143796,-5.314651528,-6.703638247,0.7911392405,0.4555808656,0.5733616192,0.5758710049,0.6963788301,0.2337131171,0.2357795461,0,0,0,0.226039783,-9.453302961,0.2293446477,-4.261445436,-6.615598886,-1.285422144,-7.30916593,-8.479636928,-2.898900833,-3.168992626,1.0171790235,-8.997722096,0.8027062668,-3.685574431,-5.919220056,-1.051709027,-7.073386384,-8.479636928,-2.898900833,-3.168992626 +050,2,3,26,015,Michigan,Barry County,59173,59177,59092,58921,59025,59094,59305,59434,59801,60689,61195,61481,62061,-85,-171,104,69,211,129,367,888,506,286,580,154,629,641,624,618,656,627,637,639,625,658,97,489,506,557,479,551,565,569,597,589,628,57,140,135,67,139,105,62,68,42,36,30,2,14,14,9,15,29,38,30,18,12,11,-148,-326,-42,2,71,5,268,790,449,239,541,-146,-312,-28,11,86,34,306,820,467,251,552,4,1,-3,-9,-14,-10,-1,0,-3,-1,-2,603,605,604,605,606,612,611,606,605,605,601,601,10.65984256,10.869380903,10.565616031,10.439277359,11.04944458,10.517046169,10.573491576,10.485379541,10.189442108,10.652247819,8.2872225941,8.5801977176,9.4311668741,8.0912845548,9.2808597007,9.4770830712,9.4447672006,9.7961996653,9.6025302423,10.166583024,2.3726199656,2.2891831855,1.1344491572,2.347992804,1.7685848794,1.0399630981,1.1287243755,0.6891798759,0.5869118654,0.4856647942,0.2372619966,0.2373967748,0.1523886928,0.2533805184,0.4884663,0.6373967375,0.4979666362,0.295362804,0.1956372885,0.1780770912,-5.524815063,-0.712190324,0.0338641539,1.1993344538,0.0842183276,4.4953243595,13.113121421,7.3676610548,3.896442662,8.7581551213,-5.287553066,-0.47479355,0.1862528467,1.4527149723,0.5726846276,5.132721097,13.611088057,7.6630238588,4.0920799504,8.9362322125 +050,2,3,26,017,Michigan,Bay County,107771,107773,107678,107423,106980,106817,106073,105271,104421,104085,103674,102964,102387,-95,-255,-443,-163,-744,-802,-850,-336,-411,-710,-577,297,1153,1070,1030,1088,1030,1019,1051,939,971,921,311,1160,1190,1138,1158,1298,1247,1277,1242,1238,1242,-14,-7,-120,-108,-70,-268,-228,-226,-303,-267,-321,10,78,54,33,24,14,17,11,8,2,3,-81,-323,-364,-76,-697,-544,-637,-115,-112,-446,-261,-71,-245,-310,-43,-673,-530,-620,-104,-104,-444,-258,-10,-3,-13,-12,-1,-4,-2,-6,-4,1,2,1438,1438,1438,1438,1438,1438,1439,1439,1439,1439,1439,1438,10.720545232,9.9812036212,9.6353082597,10.221241016,9.7471421001,9.7190164622,10.081244664,9.0393195963,9.3980777979,8.9700074507,10.785630936,11.100590943,10.645612427,10.878857626,12.283291695,11.893634473,12.249047989,11.956160744,11.982307223,12.096361839,-0.065085704,-1.119387322,-1.010304167,-0.65761661,-2.536149595,-2.174618011,-2.167803325,-2.916841148,-2.584229425,-3.126354388,0.7252407009,0.5037242949,0.308704051,0.2254685518,0.1324854266,0.162142571,0.1055125512,0.0770123075,0.0193575238,0.0292182653,-3.003240338,-3.395474877,-0.710954784,-6.547982526,-5.148005148,-6.075577514,-1.103085763,-1.078172305,-4.316727804,-2.541989082,-2.277999637,-2.891750582,-0.402250733,-6.322513974,-5.015519721,-5.913434943,-0.997573211,-1.001159998,-4.29737028,-2.512770817 +050,2,3,26,019,Michigan,Benzie County,17525,17519,17495,17380,17319,17340,17466,17386,17523,17625,17748,17767,17852,-24,-115,-61,21,126,-80,137,102,123,19,85,37,146,147,145,169,155,145,175,153,142,141,58,200,204,207,224,209,217,181,211,213,230,-21,-54,-57,-62,-55,-54,-72,-6,-58,-71,-89,0,-2,-3,-2,-2,-2,1,1,1,1,0,0,-59,4,82,181,-22,210,107,179,89,176,0,-61,1,80,179,-24,211,108,180,90,176,-3,0,-5,3,2,-2,-2,0,1,0,-2,252,252,252,252,252,252,252,252,252,252,252,252,8.3727598566,8.4728666532,8.3672350616,9.7109693731,8.8947549638,8.3073133003,9.957892341,8.650665762,7.996621146,7.9171228839,11.46953405,11.758263927,11.944949364,12.871344021,11.993572822,12.432324043,10.299305793,11.93000311,11.994931719,12.914455768,-3.096774194,-3.285397274,-3.577714302,-3.160374648,-3.098817858,-4.125010742,-0.341413452,-3.279337348,-3.998310573,-4.997332884,-0.114695341,-0.172915646,-0.115410139,-0.114922714,-0.114771032,0.0572918159,0.0569022419,0.0565402991,0.0563142334,0,-3.383512545,0.2305541946,4.73181569,10.40050566,-1.26248135,12.031281331,6.0885398885,10.120713539,5.0119667746,9.8823661529,-3.498207885,0.0576385487,4.6164055512,10.285582945,-1.377252381,12.088573147,6.1454421304,10.177253838,5.068281008,9.8823661529 +050,2,3,26,021,Michigan,Berrien County,156813,156810,156740,156911,156669,156205,156074,155136,154451,154264,153892,153352,153025,-70,171,-242,-464,-131,-938,-685,-187,-372,-540,-327,482,1946,1817,1833,1869,1791,1720,1717,1670,1648,1644,426,1610,1672,1653,1701,1844,1719,1816,1808,1711,1818,56,336,145,180,168,-53,1,-99,-138,-63,-174,85,353,474,438,419,353,437,328,223,176,154,-204,-514,-856,-1092,-707,-1237,-1121,-411,-454,-653,-312,-119,-161,-382,-654,-288,-884,-684,-83,-231,-477,-158,-7,-4,-5,10,-11,-1,-2,-5,-3,0,5,3531,3531,3576,3612,3636,3611,3562,3496,3489,3500,3512,3512,12.40869629,11.588749282,11.717176883,11.97006523,11.509912921,11.111577683,11.123528173,10.83866613,10.727630157,10.731876087,10.266187578,10.663945405,10.566553948,10.894104311,11.850518942,11.105117463,11.764896426,11.734316385,11.137727669,11.867731586,2.1425087119,0.9248038778,1.1506229345,1.0759609196,-0.340606022,0.0064602196,-0.641368252,-0.895650255,-0.410097512,-1.135855498,2.2509094503,3.0231519867,2.7998491405,2.6834977696,2.2685646348,2.8231159577,2.1249372398,1.4473188904,1.1456692401,1.005297395,-3.277528208,-5.459531858,-6.980445802,-4.528002203,-7.949616015,-7.241906152,-2.662650017,-2.946559535,-4.25069326,-2.036706411,-1.026618758,-2.436379871,-4.180596662,-1.844504434,-5.68105138,-4.418790195,-0.537712777,-1.499240644,-3.10502402,-1.031409016 +050,2,3,26,023,Michigan,Branch County,45248,45242,45173,43921,43790,43582,43733,43635,43451,43345,43474,43444,43424,-69,-1252,-131,-208,151,-98,-184,-106,129,-30,-20,131,548,479,550,554,518,536,536,532,561,568,77,434,447,448,418,475,456,489,472,436,449,54,114,32,102,136,43,80,47,60,125,119,9,43,54,49,51,46,47,38,28,30,22,-135,-1423,-217,-362,-27,-184,-310,-190,42,-186,-162,-126,-1380,-163,-313,24,-138,-263,-152,70,-156,-140,3,14,0,3,-9,-3,-1,-1,-1,1,1,3148,3148,1896,1969,1967,1985,1973,1969,1962,1973,1974,1868,12.301614026,10.922233243,12.589845717,12.689686766,11.857888472,12.3096709,12.350799576,12.255381886,12.908718562,13.077312704,9.7425191371,10.192564217,10.255001602,9.5745290042,10.873546379,10.472406587,11.267800359,10.873195959,10.032444373,10.337523599,2.5590948885,0.7296690267,2.3348441148,3.1151577621,0.9843420932,1.8372643134,1.0829992166,1.382185927,2.8762741895,2.7397891053,0.9652726334,1.2313164825,1.1216408003,1.1681841608,1.053017123,1.0793927841,0.8756163879,0.6450200993,0.6903058055,0.5065156329,-31.94378971,-4.948068087,-8.286407545,-0.618450438,-4.212068492,-7.119399215,-4.378081939,0.9675301489,-4.279895994,-3.729796933,-30.97851707,-3.716751605,-7.164766744,0.5497337227,-3.159051369,-6.04000643,-3.502465551,1.6125502482,-3.589590188,-3.2232813 +050,2,3,26,025,Michigan,Calhoun County,136146,136150,135953,135111,134755,134782,134845,134377,134343,134127,133858,133806,133580,-197,-842,-356,27,63,-468,-34,-216,-269,-52,-226,409,1662,1619,1683,1700,1670,1647,1617,1492,1509,1508,453,1468,1449,1463,1457,1463,1561,1574,1531,1506,1489,-44,194,170,220,243,207,86,43,-39,3,19,51,195,330,296,335,308,341,242,150,98,82,-203,-1235,-860,-485,-501,-984,-457,-498,-377,-154,-331,-152,-1040,-530,-189,-166,-676,-116,-256,-227,-56,-249,-1,4,4,-4,-14,1,-4,-3,-3,1,4,4275,4277,4205,4090,4020,4016,3995,4137,4228,4332,4293,4294,12.262786648,11.998547427,12.488081414,12.610013092,12.406118371,12.258112533,12.046038664,11.134951583,11.275330265,11.279573351,10.831390373,10.738662892,10.855652471,10.807522985,10.868353998,11.618041084,11.72570492,11.42601265,11.252914101,11.137456711,1.4313962754,1.2598845353,1.632428943,1.8024901067,1.5377643729,0.6400714498,0.3203337431,-0.291061067,0.0224161635,0.1421166404,1.4387746067,2.4456582156,2.1963589414,2.4849143446,2.2880745259,2.5379577255,1.8028085075,1.1194656417,0.7322613426,0.6133455005,-9.112239176,-6.373533531,-3.598763806,-3.716245035,-7.309952381,-3.401309914,-3.709911722,-2.813590313,-1.150696395,-2.475821472,-7.673464569,-3.927875316,-1.402404865,-1.23133069,-5.021877855,-0.863352188,-1.907103215,-1.694124671,-0.418435053,-1.862475971 +050,2,3,26,027,Michigan,Cass County,52293,52287,52245,52210,51815,51601,51585,51370,51326,51534,51773,51847,51584,-42,-35,-395,-214,-16,-215,-44,208,239,74,-263,108,471,469,440,537,513,484,485,489,483,463,104,479,497,524,511,567,515,528,541,549,582,4,-8,-28,-84,26,-54,-31,-43,-52,-66,-119,8,18,13,-2,13,12,12,12,2,0,1,-53,-43,-385,-118,-48,-171,-19,244,290,142,-145,-45,-25,-372,-120,-35,-159,-7,256,292,142,-144,-1,-2,5,-10,-7,-2,-6,-5,-1,-2,0,474,474,474,474,610,611,610,610,625,611,555,491,9.0182375185,9.017063206,8.509321575,10.408388735,9.965518916,9.4258783205,9.430293603,9.4669286689,9.3225246091,8.9528284557,9.1714135274,9.5553953377,10.133828421,9.9044444014,11.014520907,10.029601932,10.266381489,10.47363683,10.596409959,11.253879398,-0.153176009,-0.538332132,-1.624506846,0.5039443335,-1.049001991,-0.603723611,-0.836087886,-1.006708161,-1.27388535,-2.301050942,0.3446460198,0.2499399183,-0.038678734,0.2519721668,0.2331115536,0.2336994625,0.233326852,0.0387195447,0,0.0193365625,-0.823321047,-7.402066811,-2.282045331,-0.93035877,-3.321839639,-0.370024149,4.744312658,5.6143339754,2.7407836325,-2.803801568,-0.478675028,-7.152126893,-2.320724066,-0.678386603,-3.088728085,-0.136324686,4.97763951,5.6530535201,2.7407836325,-2.784465006 +050,2,3,26,029,Michigan,Charlevoix County,25949,25955,25936,26106,26193,26258,26222,26219,26214,26218,26247,26202,26105,-19,170,87,65,-36,-3,-5,4,29,-45,-97,55,248,242,257,212,239,245,217,223,218,240,43,284,236,290,300,287,269,281,300,303,319,12,-36,6,-33,-88,-48,-24,-64,-77,-85,-79,5,55,70,24,33,28,28,25,22,20,12,-35,151,18,75,26,20,-7,44,84,22,-30,-30,206,88,99,59,48,21,69,106,42,-18,-1,0,-7,-1,-7,-3,-2,-1,0,-2,0,279,279,279,279,279,279,279,279,279,279,279,279,9.530763614,9.2544790531,9.7996225048,8.0792682927,9.1150054347,9.3452596647,8.2773878547,8.5009053655,8.3128372324,9.1765920431,10.914261558,9.0250291593,11.057939791,11.432926829,10.945634141,10.260713673,10.718645102,11.436195559,11.554081107,12.197220257,-1.383497944,0.2294498939,-1.258317287,-3.353658537,-1.830628707,-0.915454008,-2.441257247,-2.935290193,-3.241243875,-3.020628214,2.1136774144,2.6769154286,0.9151398448,1.2576219512,1.0678667455,1.068029676,0.9536161123,0.838654341,0.7626456176,0.4588296022,5.803005265,0.6883496816,2.859812015,0.9908536585,0.7627619611,-0.267007419,1.6783643576,3.2021347565,0.8389101794,-1.147074005,7.9166826794,3.3652651102,3.7749518598,2.2484756098,1.8306287065,0.801022257,2.6319804699,4.0407890975,1.6015557971,-0.688244403 +050,2,3,26,031,Michigan,Cheboygan County,26152,26143,26059,25884,25745,25573,25635,25399,25452,25448,25574,25331,25365,-84,-175,-139,-172,62,-236,53,-4,126,-243,34,48,169,203,190,214,214,210,231,232,187,178,96,289,306,304,299,324,304,345,331,355,393,-48,-120,-103,-114,-85,-110,-94,-114,-99,-168,-215,0,10,7,3,5,2,1,0,0,0,0,-34,-64,-38,-56,143,-127,147,111,225,-74,250,-34,-54,-31,-53,148,-125,148,111,225,-74,250,-2,-1,-5,-5,-1,-1,-1,-1,0,-1,-1,388,389,390,391,390,389,390,391,391,391,391,391,6.5071328187,7.8637974782,7.4048092287,8.3580690517,8.3865658189,8.2594245934,9.0766208251,9.0941162636,7.3470189569,7.0222502762,11.127582157,11.853803095,11.847694766,11.677862834,12.697417408,11.956500364,13.555992141,12.974795186,13.947549357,15.504181789,-4.620449339,-3.990005617,-4.442885537,-3.319793782,-4.310851589,-3.69707577,-4.479371316,-3.880678923,-6.6005304,-8.481931513,0.3850374449,0.2711654303,0.1169180405,0.1952819872,0.0783791198,0.0393305933,0,0,0,0,-2.464239647,-1.472040907,-2.182470088,5.5850648336,-4.977074107,5.7815972154,4.3614931238,8.8197248246,-2.907376486,9.862711062,-2.079202202,-1.200875477,-2.065552048,5.7803468208,-4.898694988,5.8209278087,4.3614931238,8.8197248246,-2.907376486,9.862711062 +050,2,3,26,033,Michigan,Chippewa County,38520,38676,38623,38904,39006,38587,38275,37998,37724,37699,37423,37287,36958,-53,281,102,-419,-312,-277,-274,-25,-276,-136,-329,86,379,347,346,354,376,355,317,305,319,313,96,360,368,345,373,370,335,334,404,392,402,-10,19,-21,1,-19,6,20,-17,-99,-73,-89,7,58,69,59,49,21,14,11,3,0,-1,-54,203,56,-492,-344,-304,-308,-16,-182,-63,-239,-47,261,125,-433,-295,-283,-294,-5,-179,-63,-240,4,1,-2,13,2,0,0,-3,2,0,0,5083,4969,5079,5223,4886,4884,4900,4808,4827,4641,4823,4619,9.7772388974,8.907714029,8.9183302618,9.2113137831,9.8593211228,9.3764031589,8.4059239224,8.1201245973,8.5396867889,8.4315442117,9.2870870793,9.446797587,8.8925547408,9.7057063308,9.7019915304,8.8481550936,8.8567147952,10.755837172,10.493909785,10.829012055,0.4901518181,-0.539083558,0.025775521,-0.494392548,0.1573295924,0.5282480653,-0.450790873,-2.635712574,-1.954222996,-2.397467843,1.4962529183,1.7712745476,1.5207557383,1.2750123598,0.5506535733,0.3697736457,0.2916882118,0.079870078,0,-0.026937841,5.2368852142,1.4375561545,-12.68155633,-8.951107179,-7.971366014,-8.135020205,-0.424273763,-4.845451399,-1.686521215,-6.438143983,6.7331381325,3.2088307021,-11.16080059,-7.676094819,-7.420712441,-7.76524656,-0.132585551,-4.765581321,-1.686521215,-6.465081824 +050,2,3,26,035,Michigan,Clare County,30926,30924,31005,31002,30796,30598,30727,30611,30382,30553,30684,30884,30771,81,-3,-206,-198,129,-116,-229,171,131,200,-113,91,325,314,327,315,341,331,324,338,325,301,72,405,406,394,366,442,431,474,432,414,437,19,-80,-92,-67,-51,-101,-100,-150,-94,-89,-136,0,4,3,5,3,7,5,7,1,1,0,60,75,-111,-132,177,-18,-133,315,224,289,23,60,79,-108,-127,180,-11,-128,322,225,290,23,2,-2,-6,-4,0,-4,-1,-1,0,-1,0,391,391,391,477,462,445,407,391,391,391,391,391,10.482687439,10.16214117,10.65250676,10.273134937,11.118719228,10.853704523,10.634282432,11.039077682,10.557432432,9.7640094072,13.06304127,13.139583805,12.835130469,11.936404403,14.411946917,14.132769334,15.557561336,14.109117037,13.448544699,14.175654854,-2.580353831,-2.977442636,-2.182623709,-1.663269466,-3.293227689,-3.279064811,-4.923278904,-3.070039355,-2.891112266,-4.411645446,0.1290176916,0.0970905207,0.1628823664,0.0978393804,0.2282435032,0.1639532405,0.2297530155,0.0326599931,0.0324844075,0,2.4190817166,-3.592349267,-4.300094472,5.7725234407,-0.586911865,-4.361156198,10.338885698,7.3158384637,9.387993763,0.7460870976,2.5480994081,-3.495258746,-4.137212105,5.870362821,-0.358668362,-4.197202958,10.568638713,7.3484984568,9.4204781705,0.7460870976 +050,2,3,26,037,Michigan,Clinton County,75382,75362,75400,75902,76171,76821,76973,77037,77639,78550,79229,79615,79753,38,502,269,650,152,64,602,911,679,386,138,196,804,749,801,816,807,812,829,794,825,819,152,566,542,572,666,611,603,655,615,623,634,44,238,207,229,150,196,209,174,179,202,185,21,92,120,101,86,92,103,87,51,23,25,-23,175,-60,330,-73,-223,294,654,455,161,-75,-2,267,60,431,13,-131,397,741,506,184,-50,-4,-3,2,-10,-11,-1,-4,-4,-6,0,3,680,680,680,680,679,680,680,653,630,629,653,628,10.62775112,9.8505323101,10.471135746,10.611597331,10.479838971,10.499366418,10.61534423,10.064710766,10.387550049,10.278098489,7.4817252911,7.1281555569,7.4775151642,8.6609360573,7.9345497046,7.7969432879,8.3872743919,7.7957142586,7.8441741583,7.9564278902,3.1460258291,2.7223767533,2.9936205815,1.9506612742,2.5452892669,2.7024231296,2.2280698385,2.2689965078,2.5433758908,2.3216705989,1.2161108247,1.5781894222,1.3203304748,1.1183791305,1.1947276151,1.3318161835,1.1140349192,0.6464738653,0.2895923044,0.3137392701,2.3132542861,-0.789094711,4.3139510563,-0.94932182,-2.89591585,3.8014947374,8.3744693929,5.7675609555,2.0271461308,-0.94121781,3.5293651108,0.7890947111,5.6342815311,0.1690573104,-1.701188235,5.1333109209,9.4885043121,6.4140348209,2.3167384352,-0.62747854 +050,2,3,26,039,Michigan,Crawford County,14074,14081,14054,14040,13952,13878,13740,13854,13754,13894,13881,14012,13981,-27,-14,-88,-74,-138,114,-100,140,-13,131,-31,34,132,109,101,126,136,114,124,124,111,104,46,175,153,162,174,173,172,195,192,175,187,-12,-43,-44,-61,-48,-37,-58,-71,-68,-64,-83,1,2,8,9,8,9,3,2,2,1,1,-14,27,-49,-19,-97,142,-45,209,54,194,51,-13,29,-41,-10,-89,151,-42,211,56,195,52,-2,0,-3,-3,-1,0,0,0,-1,0,0,197,197,197,197,197,197,197,197,197,197,197,197,9.3970242756,7.7879394113,7.2583542939,9.1244840322,9.8572153367,8.2584758041,8.9699074074,8.9288928893,7.9589861256,7.4304290358,12.458176123,10.93169477,11.642112828,12.600477949,12.538957744,12.460156476,14.105902778,13.825382538,12.547951099,13.360482978,-3.061151847,-3.143755359,-4.383758534,-3.475993917,-2.681742408,-4.201680672,-5.13599537,-4.896489649,-4.588964973,-5.930053942,0.1423791557,0.5715918834,0.646784046,0.5793323195,0.6523157208,0.2173283106,0.1446759259,0.1440144014,0.0717025777,0.071446433,1.9221186018,-3.501000286,-1.365432986,-7.024404374,10.292092484,-3.25992466,15.118634259,3.8883888389,13.910300075,3.6437680849,2.0644977575,-2.929408402,-0.71864894,-6.445072054,10.944408205,-3.042596349,15.263310185,4.0324032403,13.982002653,3.7152145179 +050,2,3,26,041,Michigan,Delta County,37069,37069,37049,36946,36840,36806,36592,36431,36217,35911,35887,35744,35612,-20,-103,-106,-34,-214,-161,-214,-306,-24,-143,-132,82,371,360,388,373,375,351,361,348,314,329,115,445,425,414,405,440,435,483,453,465,460,-33,-74,-65,-26,-32,-65,-84,-122,-105,-151,-131,1,0,3,6,7,-1,4,2,-1,0,2,18,-28,-38,-10,-190,-93,-131,-184,83,10,-4,19,-28,-35,-4,-183,-94,-127,-182,82,10,-2,-6,-1,-6,-4,1,-2,-3,-2,-1,-2,1,623,623,623,623,623,623,623,623,623,623,633,633,10.027704575,9.7579486623,10.536892703,10.16376468,10.270736617,9.6630327056,10.009982254,9.6938633388,8.7671538859,9.2213689108,12.027839719,11.519800504,11.242973142,11.035723044,12.050997631,11.975553353,13.392857143,12.618735898,12.983205595,12.893099389,-2.000135144,-1.761851842,-0.706080439,-0.871958364,-1.780261014,-2.312520648,-3.382874889,-2.924872559,-4.216051709,-3.671730478,0,0.0813162389,0.1629416397,0.1907408921,-0.027388631,0.1101200308,0.0554569654,-0.027855929,0,0.0560569539,-0.756807892,-1.030005692,-0.2715694,-5.177252786,-2.547142681,-3.60643101,-5.102040816,2.3120421182,0.2792087225,-0.112113908,-0.756807892,-0.948689453,-0.10862776,-4.986511894,-2.574531312,-3.496310979,-5.046583851,2.284186189,0.2792087225,-0.056056954 +050,2,3,26,043,Michigan,Dickinson County,26168,26168,26156,26069,26176,26024,25910,25675,25531,25453,25431,25336,25112,-12,-87,107,-152,-114,-235,-144,-78,-22,-95,-224,56,220,263,254,254,217,270,288,236,236,255,44,334,293,318,288,331,316,325,288,298,334,12,-114,-30,-64,-34,-114,-46,-37,-52,-62,-79,3,-1,-1,4,3,7,12,10,7,3,1,-25,28,141,-90,-82,-126,-111,-49,24,-36,-145,-22,27,140,-86,-79,-119,-99,-39,31,-33,-144,-2,0,-3,-2,-1,-2,1,-2,-1,0,-1,453,453,436,433,433,437,438,436,434,438,433,433,8.4250837721,10.067949086,9.7318007663,9.7816459352,8.4132984395,10.545639183,11.297662012,9.2760003144,9.2973782181,10.1094196,12.790809,11.216384343,12.183908046,11.091000116,12.833187942,12.342303636,12.749097756,11.319864791,11.739909784,13.241357437,-4.365725227,-1.148435257,-2.45210728,-1.30935418,-4.419889503,-1.796664453,-1.451435745,-2.043864476,-2.442531566,-3.131937837,-0.038295835,-0.038281175,0.153256705,0.1155312512,0.2713967239,0.4686950748,0.392279931,0.2751356025,0.1181870112,0.0396447827,1.0722833892,5.3976457077,-3.448275862,-3.1578542,-4.885141029,-4.335429442,-1.922171662,0.9433220659,-1.418244135,-5.748493498,1.0339875539,5.3593645325,-3.295019157,-3.042322948,-4.613744306,-3.866734367,-1.529891731,1.2184576684,-1.300057124,-5.708848716 +050,2,3,26,045,Michigan,Eaton County,107759,107759,107745,107927,108013,108288,108668,108701,109220,109479,109684,110119,110148,-14,182,86,275,380,33,519,259,205,435,29,283,1194,1130,1180,1193,1181,1182,1161,1122,1100,1090,242,952,915,1030,956,997,986,1041,1053,1080,1079,41,242,215,150,237,184,196,120,69,20,11,50,225,203,141,152,168,194,159,103,44,52,-99,-283,-325,-2,18,-313,137,-14,38,373,-38,-49,-58,-122,139,170,-145,331,145,141,417,14,-6,-2,-7,-14,-27,-6,-8,-6,-5,-2,4,1559,1559,1559,1546,1615,1642,1618,1631,1698,1768,1711,1811,11.072369153,10.465870149,10.910721633,10.997621638,10.866314884,10.847967842,10.617332498,10.238954568,10.008962571,9.8970794536,8.8282206313,8.4745762712,9.5237654935,8.8128468445,9.1733411848,9.0491508391,9.5199337903,9.609286239,9.8269814334,9.7972006701,2.2441485218,1.9912938779,1.3869561398,2.184774793,1.6929736991,1.7988170025,1.0973987078,0.6296683291,0.1819811377,0.0998787835,2.0865017248,1.880151894,1.3037387714,1.4012057744,1.5457585948,1.780461727,1.4540532879,0.9399396796,0.4003585028,0.4721542492,-2.624355503,-3.010095397,-0.018492749,0.1659322628,-2.879895477,1.2573363742,-0.128029849,0.3467738624,3.3939482173,-0.345035797,-0.537853778,-1.129943503,1.2852460229,1.5671380372,-1.334136882,3.0377981011,1.3260234386,1.286713542,3.7943067201,0.1271184517 +050,2,3,26,047,Michigan,Emmet County,32694,32696,32655,32749,32813,32955,32980,32931,32910,33102,33168,33337,33342,-41,94,64,142,25,-49,-21,192,66,169,5,64,336,312,293,299,290,322,281,269,279,279,97,308,344,307,391,371,363,382,382,318,341,-33,28,-32,-14,-92,-81,-41,-101,-113,-39,-62,2,20,20,15,13,16,19,18,12,3,5,-7,47,83,146,110,19,3,276,170,204,61,-5,67,103,161,123,35,22,294,182,207,66,-3,-1,-7,-5,-6,-3,-2,-1,-3,1,1,505,505,505,505,505,505,505,505,505,505,505,505,10.274600942,9.5177084287,8.9101082593,9.0695381815,8.7997451108,9.7811394116,8.5136035872,8.1183039083,8.3903465905,8.3684518364,9.4183841967,10.493883652,9.3358472205,11.860165314,11.257604952,11.026563995,11.573653275,11.528595141,9.5631907375,10.2281078,0.8562167452,-0.976175223,-0.425738961,-2.790627133,-2.457859841,-1.245424583,-3.060049688,-3.410291233,-1.172844147,-1.859655964,0.6115833894,0.6101095147,0.456148887,0.394327747,0.4855031785,0.5771479777,0.5453553899,0.3621548212,0.0902187805,0.1499722551,1.4372209651,2.5319544858,4.4398491668,3.3366193979,0.5765350245,0.0911286281,8.3621159789,5.1305266335,6.1348770769,1.8296615126,2.0488043545,3.1420640005,4.8959980538,3.7309471449,1.062038203,0.6682766058,8.9074713688,5.4926814547,6.2250958575,1.9796337678 +050,2,3,26,049,Michigan,Genesee County,425790,425790,424959,422062,418243,415713,412950,410574,409054,407673,406626,405702,404794,-831,-2897,-3819,-2530,-2763,-2376,-1520,-1381,-1047,-924,-908,1316,5217,4966,4914,5031,4818,4753,4779,4660,4630,4486,1101,4138,4199,4227,4438,4693,4438,4659,4765,4640,4916,215,1079,767,687,593,125,315,120,-105,-10,-430,73,268,227,203,237,213,328,239,146,64,79,-1161,-4263,-4920,-3460,-3630,-2709,-2157,-1735,-1083,-988,-573,-1088,-3995,-4693,-3257,-3393,-2496,-1829,-1496,-937,-924,-494,42,19,107,40,37,-5,-6,-5,-5,10,16,5973,5973,5971,5939,5904,5867,5882,5814,5788,5759,5675,5677,12.31846672,11.819517913,11.784794402,12.142451153,11.700934035,11.597944433,11.702808895,11.445427294,11.399336229,11.069764687,9.7707140673,9.9939902773,10.137225465,10.711230018,11.397360611,10.82930305,11.408953053,11.703317823,11.423956825,12.130843335,2.5477526531,1.8255276358,1.6475689365,1.4312211357,0.3035734235,0.7686413837,0.2938558417,-0.257890529,-0.024620597,-1.061078648,0.6328060343,0.5402800174,0.486836236,0.572005749,0.5172891136,0.8003630915,0.5852628847,0.3585906405,0.1575718183,0.1949423563,-10.06586614,-11.71003386,-8.297799884,-8.761100713,-6.579043234,-5.263363379,-4.248665711,-2.659956601,-2.432514945,-1.413948989,-9.433060101,-11.16975384,-7.810963648,-8.189094964,-6.06175412,-4.463000288,-3.663402826,-2.30136596,-2.274943126,-1.219006633 +050,2,3,26,051,Michigan,Gladwin County,25692,25696,25734,25873,25543,25562,25498,25227,25146,25236,25326,25430,25424,38,139,-330,19,-64,-271,-81,90,90,104,-6,64,245,207,244,253,296,268,239,271,234,263,54,331,336,342,323,346,363,337,398,389,410,10,-86,-129,-98,-70,-50,-95,-98,-127,-155,-147,2,11,12,0,2,2,-1,-1,-1,-1,-1,29,214,-211,118,8,-223,17,189,217,261,143,31,225,-199,118,10,-221,16,188,216,260,142,-3,0,-2,-1,-4,0,-2,0,1,-1,-1,289,289,289,289,289,289,289,289,289,289,289,289,9.4948359719,8.0519682589,9.5489678114,9.9099099099,11.67077378,10.640620968,9.4875153825,10.719512678,9.2205847585,10.343335824,12.82771717,13.069861522,13.384208982,12.651782217,13.64218827,14.412482878,13.377793656,15.743048139,15.328237056,16.124591969,-3.332881198,-5.017893263,-3.83524117,-2.741872307,-1.97141449,-3.77186191,-3.890278274,-5.023535461,-6.107652297,-5.781256145,0.4262987579,0.4667807686,0,0.0783392088,0.0788565796,-0.03970381,-0.039696717,-0.039555397,-0.039404208,-0.039328273,8.2934485632,-8.207561848,4.6179434498,0.3133568351,-8.792508625,0.6749647629,7.5026795284,8.5835212215,10.284498384,5.6239430527,8.7197473211,-7.74078108,4.6179434498,0.3916960439,-8.713652045,0.6352609533,7.4629828113,8.5439658241,10.245094176,5.5846147796 +050,2,3,26,053,Michigan,Gogebic County,16427,16424,16397,16113,16037,15905,15756,15537,15331,15337,15095,13971,13842,-27,-284,-76,-132,-149,-219,-206,6,-242,-1124,-129,31,140,123,115,117,129,118,132,118,127,128,38,242,230,221,202,191,216,197,195,188,219,-7,-102,-107,-106,-85,-62,-98,-65,-77,-61,-91,3,0,7,6,5,2,3,2,1,4,2,-22,-183,26,-30,-68,-159,-110,69,-166,-1068,-39,-19,-183,33,-24,-63,-157,-107,71,-165,-1064,-37,-1,1,-2,-2,-1,0,-1,0,0,1,-1,1549,1523,1443,1549,1549,1549,1537,1469,1480,1314,372,372,8.6127345432,7.6516329705,7.2005509987,7.3907962477,8.2446553542,7.6454580796,8.6083213773,7.7549947424,8.7387325397,9.2043289109,14.887726853,14.307931571,13.837580615,12.760178137,12.207202889,13.995075807,12.84726751,12.815457413,12.936076516,15.748031496,-6.27499231,-6.6562986,-6.637029616,-5.369381889,-3.962547535,-6.349617727,-4.238946133,-5.060462671,-4.197343976,-6.543702585,0,0.4354587869,0.3756809217,0.3158459935,0.127824114,0.1943760529,0.1304291118,0.0657202944,0.2752356705,0.1438176392,-11.25807444,1.6174183515,-1.878404608,-4.295505512,-10.16201706,-7.127121939,4.4998043563,-10.90956887,-73.48792403,-2.804443965,-11.25807444,2.0528771384,-1.502723687,-3.979659518,-10.03419295,-6.932745886,4.6302334681,-10.84384858,-73.21268836,-2.660626326 +050,2,3,26,055,Michigan,Grand Traverse County,86986,86988,86975,88362,89238,90149,90908,91610,92076,91914,92587,93032,93592,-13,1387,876,911,759,702,466,-162,673,445,560,233,873,926,916,990,934,944,920,870,849,870,190,768,776,818,811,859,857,890,932,895,953,43,105,150,98,179,75,87,30,-62,-46,-83,4,11,51,22,31,26,62,34,25,21,17,-49,1264,670,787,553,603,321,-226,711,470,629,-45,1275,721,809,584,629,383,-192,736,491,646,-11,7,5,4,-4,-2,-4,0,-1,0,-3,2642,2642,2645,2654,2665,2669,2694,2415,1362,1455,1484,1490,9.9579666585,10.427927928,10.212557209,10.935782654,10.234606998,10.278409895,10.000543508,9.4308431933,9.147770433,9.3235596708,8.7602730741,8.7387387387,9.1199473763,8.9585047803,9.4127702473,9.3311411866,9.6744388282,10.102926271,9.6434093493,10.213048697,1.1976935844,1.6891891892,1.0926098324,1.9772778738,0.8218367503,0.9472687086,0.3261046796,-0.672083078,-0.495638916,-0.889489026,0.1254726612,0.5743243243,0.2452797583,0.3424335983,0.2849034068,0.6750650567,0.3695853035,0.2710012412,0.22626994,0.1821844993,14.417949435,7.545045045,8.7743258988,6.1085735431,6.6075674728,3.4950948902,-2.456655253,7.7072752993,5.0641367532,6.7408264746,14.543422096,8.1193693694,9.019605657,6.4510071414,6.8924708796,4.1701599469,-2.087069949,7.9782765405,5.2904066933,6.9230109739 +050,2,3,26,057,Michigan,Gratiot County,42476,42478,42431,42121,41975,41937,41468,41333,40937,40978,40582,40681,40283,-47,-310,-146,-38,-469,-135,-396,41,-396,99,-398,111,439,432,404,376,421,370,385,406,406,384,122,422,397,467,411,465,451,473,453,467,460,-11,17,35,-63,-35,-44,-81,-88,-47,-61,-76,5,22,19,16,9,10,14,8,4,5,3,-38,-350,-196,11,-454,-99,-331,122,-354,153,-326,-33,-328,-177,27,-445,-89,-317,130,-350,158,-323,-3,1,-4,-2,11,-2,2,-1,1,2,1,5560,5560,5490,5553,5633,5412,5435,5251,5545,5420,5568,5421,10.384142303,10.273972603,9.6291352846,9.0162460284,10.168959312,8.9947733074,9.3999877922,9.955860716,9.9922473943,9.485697347,9.9820228972,9.4415905632,11.130708361,9.8555242491,11.231748409,10.963899356,11.54855643,11.108386464,11.493545648,11.363074947,0.4021194058,0.8323820396,-1.501573077,-0.839278221,-1.062789097,-1.969126048,-2.148568638,-1.152525748,-1.501298254,-1.8773776,0.5203898193,0.4518645358,0.3813518925,0.2158143996,0.2415429765,0.3403427738,0.1953244217,0.0980872977,0.1230572339,0.0741070105,-8.278928943,-4.661339422,0.2621794261,-10.88663749,-2.391275468,-8.04667558,2.9786974303,-8.680725846,3.7655513579,-8.05296181,-7.758539124,-4.209474886,0.6435313185,-10.67082309,-2.149732491,-7.706332807,3.1740218519,-8.582638548,3.8886085919,-7.9788548 +050,2,3,26,059,Michigan,Hillsdale County,46688,46691,46646,46602,46270,46138,45937,45894,45789,45831,45709,45548,45658,-45,-44,-332,-132,-201,-43,-105,42,-122,-161,110,139,568,494,544,580,543,541,552,508,477,502,115,478,447,469,445,492,485,517,493,490,521,24,90,47,75,135,51,56,35,15,-13,-19,0,-1,7,4,5,9,10,5,0,9,7,-69,-131,-388,-208,-340,-99,-170,6,-137,-157,121,-69,-132,-381,-204,-335,-90,-160,11,-137,-148,128,0,-2,2,-3,-1,-4,-1,-4,0,0,1,1641,1641,1641,1647,1651,1652,1654,1653,1617,1578,1563,1681,12.182566918,10.638297872,11.773872392,12.598425197,11.826071806,11.801533545,12.049770792,11.098973127,10.45399257,11.008047716,10.252230611,9.6261521234,10.150636309,9.6660331252,10.71533578,10.57993303,11.28574547,10.771247542,10.738902221,11.424686972,1.9303363075,1.012145749,1.6232360835,2.9323920717,1.110736026,1.2216005148,0.764025322,0.3277255844,-0.284909651,-0.416639256,-0.021448181,0.1507451116,0.0865725911,0.1086071138,0.1960122399,0.2181429491,0.1091464746,0,0.1972451428,0.1534986733,-2.809711736,-8.355586183,-4.501774738,-7.385283736,-2.156134639,-3.708430134,0.1309757695,-2.993227005,-3.440831936,2.6533342105,-2.831159918,-8.204841072,-4.415202147,-7.276676622,-1.960122399,-3.490287185,0.2401222441,-2.993227005,-3.243586793,2.8068328838 +050,2,3,26,061,Michigan,Houghton County,36628,36624,36729,36780,36752,36691,36487,36248,36354,36270,35993,35709,35126,105,51,-28,-61,-204,-239,106,-84,-277,-284,-583,108,403,375,377,365,362,385,352,356,349,372,64,362,348,368,343,354,369,365,378,320,372,44,41,27,9,22,8,16,-13,-22,29,0,42,193,204,194,173,115,156,138,88,41,44,22,-181,-264,-269,-410,-366,-65,-210,-344,-355,-623,64,12,-60,-75,-237,-251,91,-72,-256,-314,-579,-3,-2,5,5,11,4,-1,1,1,1,-4,2715,2715,2715,2856,2965,3005,3076,3116,3069,3048,2878,2768,10.964643785,10.199640973,10.26646515,9.9756757495,9.9539423936,10.605768436,9.6937651465,9.8528984404,9.7347354328,10.503282276,9.8491341196,9.4652668226,10.021377122,9.3744021427,9.7339657661,10.165009228,10.051773518,10.461785423,8.9258319154,10.503282276,1.1155096655,0.73437415,0.2450880274,0.6012736068,0.2199766275,0.4407592077,-0.358008372,-0.608886982,0.8089035173,0,5.2510576936,5.5486046891,5.2830085917,4.7281969991,3.1621640201,4.2974022754,3.8003965631,2.4355479291,1.1436222142,1.24232371,-4.92456706,-7.180547245,-7.32540882,-11.20555358,-10.06393071,-1.790584281,-5.783212161,-9.520778268,-9.902094781,-17.59017435,0.3264906338,-1.631942556,-2.042400229,-6.477356583,-6.901766687,2.506817994,-1.982815598,-7.085230339,-8.758472567,-16.34785064 +050,2,3,26,063,Michigan,Huron County,33118,33118,33084,32765,32449,32251,32034,31761,31471,31304,31193,30904,30653,-34,-319,-316,-198,-217,-273,-290,-167,-111,-289,-251,93,316,267,297,288,299,306,334,289,265,247,85,415,453,426,441,488,440,465,470,471,483,8,-99,-186,-129,-153,-189,-134,-131,-181,-206,-236,0,17,18,17,11,12,14,17,15,2,4,-38,-238,-145,-82,-72,-93,-170,-51,59,-86,-19,-38,-221,-127,-65,-61,-81,-156,-34,74,-84,-15,-4,1,-3,-4,-3,-3,0,-2,-4,1,0,524,524,524,524,524,524,524,524,524,524,524,524,9.5977159866,8.1884257981,9.1808346213,8.9600995567,9.3737753742,9.6786437247,10.641178813,9.2484439253,8.5350338986,8.0250824439,12.604595362,13.892722422,13.168469861,13.720152446,15.299004624,13.917004049,14.814814815,15.040721955,15.169814967,15.692772552,-3.006879376,-5.704296623,-3.98763524,-4.760052889,-5.92522925,-4.238360324,-4.173636002,-5.792278029,-6.634781068,-7.667690108,0.5163328221,0.5520287055,0.5255023184,0.3422260247,0.3762050317,0.4428137652,0.5416168857,0.4800230411,0.0644153502,0.1299608493,-7.228659509,-4.446897905,-2.534775889,-2.240024889,-2.915588996,-5.377024291,-1.624850657,1.8880906284,-2.769860058,-0.617314034,-6.712326687,-3.8948692,-2.00927357,-1.897798864,-2.539383964,-4.934210526,-1.083233771,2.3681136695,-2.705444707,-0.487353185 +050,2,3,26,065,Michigan,Ingham County,280895,280895,281122,282828,283592,284226,285760,287255,289633,291678,291267,291426,290609,227,1706,764,634,1534,1495,2378,2045,-411,159,-817,824,3284,3265,3248,3314,3340,3251,3244,3190,3062,3014,374,2006,1930,2062,2094,2207,2107,2087,2132,2230,2426,450,1278,1335,1186,1220,1133,1144,1157,1058,832,588,442,2153,2077,2063,2077,1946,2109,1751,1173,747,615,-690,-1731,-2698,-2657,-1766,-1578,-868,-856,-2658,-1429,-2031,-248,422,-621,-594,311,368,1241,895,-1485,-682,-1416,25,6,50,42,3,-6,-7,-7,16,9,11,18478,18477,18479,18522,18240,18074,18164,18476,18396,17194,17544,17368,11.646422555,11.528547721,11.440285444,11.628355784,11.657635489,11.270818599,11.160979235,10.94442872,10.509822497,10.356765487,7.1141058604,6.8147311183,7.2628905741,7.3475488872,7.7031142291,7.3047107931,7.1803217211,7.3145837086,7.6541163185,8.3362684375,4.5323166947,4.7138166025,4.1773948695,4.280806897,3.9545212604,3.966107806,3.9806575138,3.6298450111,2.855706178,2.0204970491,7.6354286728,7.3337805868,7.2664128295,7.2878982993,6.7921433121,7.311644548,6.0243140075,4.0243933819,2.5639573498,2.1132749749,-6.138842096,-9.52649977,-9.35863252,-6.196643426,-5.507709222,-3.009249629,-2.94506727,-9.119213648,-4.904812654,-6.978961746,1.4965865768,-2.192719184,-2.09221969,1.0912548729,1.2844340899,4.3023949189,3.0792467371,-5.094820266,-2.340855305,-4.865686771 +050,2,3,26,067,Michigan,Ionia County,63905,63901,63847,63865,63890,64001,64246,64073,64215,64293,64290,64654,64553,-54,18,25,111,245,-173,142,78,-3,364,-101,201,747,732,755,718,739,746,724,706,674,673,169,457,447,504,526,518,537,545,538,536,602,32,290,285,251,192,221,209,179,168,138,71,1,4,13,9,2,9,17,10,9,13,12,-87,-277,-272,-144,65,-404,-81,-110,-181,212,-187,-86,-273,-259,-135,67,-395,-64,-100,-172,225,-175,0,1,-1,-5,-14,1,-3,-1,1,1,3,5524,5519,5479,5551,5488,5537,5481,5374,5370,5132,5357,5069,11.698195941,11.459434073,11.806929338,11.197143013,11.518169562,11.630082315,11.267780994,10.981233911,10.454150639,10.417392247,7.1567276372,6.9977691675,7.8817117702,8.202920926,8.0736290027,8.3717884759,8.4819622125,8.3681357567,8.3136865616,9.3183805831,4.5414683037,4.4616649055,3.9252175681,2.9942220871,3.4445405591,3.2582938389,2.7858187817,2.6130981545,2.1404640774,1.0990116635,0.0626409421,0.2035145395,0.140744853,0.0311898134,0.1402754074,0.2650286855,0.1556323342,0.1399874011,0.2016379203,0.1857484502,-4.337885242,-4.258150366,-2.251917649,1.0136689357,-6.296807176,-1.262783737,-1.711955676,-2.815302178,3.2882491624,-2.894580015,-4.2752443,-4.054635826,-2.111172796,1.0448587491,-6.156531768,-0.997755051,-1.556323342,-2.675314777,3.4898870828,-2.708831565 +050,2,3,26,069,Michigan,Iosco County,25887,25895,25841,25599,25455,25433,25445,25360,25307,25180,25195,25244,25140,-54,-242,-144,-22,12,-85,-53,-127,15,49,-104,59,200,227,231,233,254,213,234,239,244,260,69,369,403,423,377,431,408,427,408,411,421,-10,-169,-176,-192,-144,-177,-195,-193,-169,-167,-161,4,9,17,12,11,5,21,20,18,8,7,-44,-80,17,156,141,88,122,46,167,210,51,-40,-71,34,168,152,93,143,66,185,218,58,-4,-2,-2,2,4,-1,-1,0,-1,-2,-1,400,400,400,400,400,400,400,400,400,400,400,400,7.7760497667,8.8925451483,9.0787612011,9.1591650615,9.9990158449,8.4078394221,9.2697129954,9.4888337469,9.6750530344,10.320736742,14.34681182,15.787205704,16.624744537,14.819764928,16.966833973,16.105157203,16.915245509,16.198511166,16.296913103,16.711654493,-6.570762053,-6.894660555,-7.545983336,-5.660599866,-6.967818128,-7.697317781,-7.645532513,-6.709677419,-6.621860069,-6.390917752,0.3499222395,0.6659615309,0.4716239585,0.4324069342,0.1968310206,0.8289419149,0.792283162,0.7146401985,0.3172148536,0.2778659892,-3.110419907,0.6659615309,6.1311114605,5.5426707025,3.464225962,4.8157577911,1.8222512726,6.6302729529,8.3268899066,2.024452207,-2.760497667,1.3319230619,6.602735419,5.9750776367,3.6610569826,5.6446997059,2.6145344346,7.3449131514,8.6441047602,2.3023181963 +050,2,3,26,071,Michigan,Iron County,11817,11817,11811,11767,11569,11506,11352,11327,11168,11112,11094,11053,11066,-6,-44,-198,-63,-154,-25,-159,-56,-18,-41,13,20,87,101,83,91,97,85,98,110,82,79,24,191,210,178,196,171,203,193,206,171,189,-4,-104,-109,-95,-105,-74,-118,-95,-96,-89,-110,0,1,2,2,2,1,1,0,0,0,0,0,59,-91,32,-48,50,-42,39,79,49,126,0,60,-89,34,-46,51,-41,39,79,49,126,-2,0,0,-2,-3,-2,0,0,-1,-1,-3,355,355,355,355,358,358,358,355,355,355,355,355,7.379760794,8.6561535824,7.1939328277,7.9622014174,8.5541690551,7.5572349411,8.7971274686,9.9072322796,7.4050661489,7.1431800714,16.201543812,17.997943092,15.427952329,17.149356899,15.080029984,18.048455212,17.324955117,18.553544087,15.442272091,17.089380171,-8.821783018,-9.34178951,-8.234019502,-9.187155482,-6.525860929,-10.49122027,-8.527827648,-8.646311808,-8.037205942,-9.946200099,0.0848248367,0.1714089818,0.173347779,0.1749934377,0.0881873098,0.0889086464,0,0,0,0,5.004665366,-7.799108673,2.7735644637,-4.199842506,4.4093654923,-3.734163147,3.5008976661,7.1151940917,4.4249785524,11.392920114,5.0894902027,-7.627699691,2.9469122427,-4.024849068,4.4975528022,-3.645254501,3.5008976661,7.1151940917,4.4249785524,11.392920114 +050,2,3,26,073,Michigan,Isabella County,70311,70313,70297,70624,70679,70240,70116,70798,71247,71035,70392,69635,69504,-16,327,55,-439,-124,682,449,-212,-643,-757,-131,178,646,629,650,680,722,639,648,690,589,597,136,466,436,451,452,475,507,495,516,517,503,42,180,193,199,228,247,132,153,174,72,94,32,217,246,234,257,207,197,145,93,51,48,-88,-69,-377,-898,-625,229,120,-512,-920,-886,-273,-56,148,-131,-664,-368,436,317,-367,-827,-835,-225,-2,-1,-7,26,16,-1,0,2,10,6,0,6540,6541,6539,6542,6143,5698,6405,6576,6240,5847,5319,4730,9.1682573924,8.9028541503,9.2251577147,9.6896463279,10.24738493,8.9971487909,9.1086715115,9.7576841763,8.4126632721,8.5813467108,6.6136345896,6.1711357862,6.400840199,6.4407649121,6.7417006117,7.1385828435,6.9580129602,7.2970507753,7.3842901726,7.2301798921,2.5546228028,2.7317183641,2.8243175157,3.2488814158,3.5056843181,1.8585659474,2.1506585513,2.460633401,1.0283730995,1.3511668188,3.0797397123,3.4818793656,3.3210567773,3.6621163328,2.9379621613,2.7737688761,2.0382058166,1.3151661281,0.7284309455,0.6899575245,-0.979272074,-5.336050898,-12.7449102,-8.905924934,3.2502093475,1.6896054067,-7.196975021,-13.01024557,-12.65470231,-3.924133421,2.1004676379,-1.854171532,-9.423853419,-5.243808601,6.1881715089,4.4633742828,-5.158769205,-11.69507944,-11.92627136,-3.234175896 +050,2,3,26,075,Michigan,Jackson County,160248,160233,160109,159666,159988,159672,159464,159325,158345,158653,158594,158357,156920,-124,-443,322,-316,-208,-139,-980,308,-59,-237,-1437,481,1827,1799,1787,1761,1828,1757,1792,1714,1698,1701,424,1501,1579,1653,1589,1647,1743,1810,1753,1711,1744,57,326,220,134,172,181,14,-18,-39,-13,-43,34,107,92,93,90,82,111,93,77,25,26,-213,-876,40,-536,-452,-388,-1105,244,-90,-252,-1420,-179,-769,132,-443,-362,-306,-994,337,-13,-227,-1394,-2,0,-30,-7,-18,-14,0,-11,-7,3,0,9672,9672,9554,9832,9511,9365,9276,8830,8660,8661,8591,7634,11.426784458,11.255920464,11.180629419,11.036047328,11.468400729,11.061793685,11.306065022,10.805460729,10.714589952,10.790511201,9.3878508326,9.879432136,10.342238629,9.9581369698,10.332853392,10.973651903,11.419630408,11.051325938,10.79662156,11.063287205,2.0389336252,1.376488328,0.8383907902,1.077910358,1.135547337,0.0881417824,-0.113565385,-0.245865209,-0.082031607,-0.272776003,0.6692205457,0.5756223917,0.581868235,0.5640228617,0.5144468598,0.6988384172,0.5867544906,0.4854261821,0.1577530912,0.1649343276,-5.478852318,0.2502706051,-3.353563161,-2.83264815,-2.434211971,-6.956904964,1.5394418892,-0.567381252,-1.590151159,-9.007951738,-4.809631772,0.8258929968,-2.771694926,-2.268625288,-1.919765111,-6.258066547,2.1261963798,-0.08195507,-1.432398068,-8.84301741 +050,2,3,26,077,Michigan,Kalamazoo County,250331,250327,250754,252634,255413,257399,259063,259816,261584,263387,265120,265531,265988,427,1880,2779,1986,1664,753,1768,1803,1733,411,457,784,3068,3050,3153,3191,3204,3161,3119,3085,3019,3044,448,2093,1904,1986,2078,2173,2065,2205,2213,2248,2383,336,975,1146,1167,1113,1031,1096,914,872,771,661,147,597,626,617,541,442,758,541,382,306,256,-27,317,1020,240,63,-701,-73,361,484,-676,-477,120,914,1646,857,604,-259,685,902,866,-370,-221,-29,-9,-13,-38,-53,-19,-13,-13,-5,10,17,8455,8456,8491,8777,8604,8773,8483,8279,8148,8459,8255,8156,12.189404594,12.006763154,12.296904129,12.357153092,12.349700026,12.125047948,11.882561132,11.674395987,11.378476626,11.453964957,8.3156531344,7.4953695229,7.7455285758,8.0470586413,8.3757484886,7.9209819716,8.4004640256,8.3745343013,8.4726119427,8.9667537755,3.8737514601,4.5113936309,4.5513755528,4.3100944503,3.9739515378,4.2040659762,3.4820971063,3.2998616858,2.9058646832,2.4872111815,2.3719278171,2.4643389293,2.4063399452,2.095023448,1.7036727252,2.9075565784,2.0610662303,1.4455816101,1.1533003801,0.9632769478,1.2594658593,4.0153765301,0.9360155379,0.2439676104,-2.701978689,-0.280015343,1.375314065,1.8315746054,-2.547813912,-1.794855875,3.6313936764,6.4797154594,3.3423554831,2.3389910584,-0.998305963,2.6275412351,3.4363802953,3.2771562155,-1.394513531,-0.831578928 +050,2,3,26,079,Michigan,Kalkaska County,17153,17147,17146,17175,17104,17296,17374,17254,17283,17582,17774,17984,18003,-1,29,-71,192,78,-120,29,299,192,210,19,46,161,182,191,167,177,185,158,175,191,192,24,187,204,180,188,188,237,194,220,179,182,22,-26,-22,11,-21,-11,-52,-36,-45,12,10,2,13,12,7,12,1,8,7,4,4,1,-25,44,-60,173,89,-109,73,326,234,194,8,-23,57,-48,180,101,-108,81,333,238,198,9,0,-2,-1,1,-2,-1,0,2,-1,0,0,138,138,138,138,138,138,138,138,138,138,138,138,9.3820110137,10.618746171,11.104651163,9.6336890684,10.222940973,10.713148218,9.0635307615,9.8993098767,10.682924101,10.67051991,10.897118382,11.902330873,10.465116279,10.845111047,10.858264988,13.724411501,11.128639036,12.444846702,10.011745623,10.114763665,-1.515107369,-1.283584702,0.6395348837,-1.211421979,-0.635324015,-3.011263283,-2.065108275,-2.545536825,0.6711784775,0.5557562453,0.7575536843,0.7001371102,0.4069767442,0.6922411307,0.0577567287,0.4632712743,0.4015488312,0.22626994,0.2237261592,0.0555756245,2.5640278547,-3.500685551,10.058139535,5.1341217191,-6.295483424,4.2273503779,18.70070271,13.236791492,10.85071872,0.4446049962,3.321581539,-2.800548441,10.465116279,5.8263628497,-6.237726695,4.6906216521,19.102251542,13.463061432,11.074444879,0.5001806208 +050,2,3,26,081,Michigan,Kent County,602622,602625,602994,608543,615871,624409,631464,637333,644219,649722,653636,656800,658708,369,5549,7328,8538,7055,5869,6886,5503,3914,3164,1908,2233,8659,8865,8921,8843,8871,8861,8752,8506,8461,8596,1050,4234,4462,4361,4488,4754,4712,4801,4992,4800,5226,1183,4425,4403,4560,4355,4117,4149,3951,3514,3661,3370,241,1207,1663,1659,1658,1445,2206,1653,1187,830,699,-1079,-59,1348,2332,1119,372,554,-71,-766,-1343,-2193,-838,1148,3011,3991,2777,1817,2760,1582,421,-513,-1494,24,-24,-86,-13,-77,-65,-23,-30,-21,16,32,11353,11349,11348,11398,11563,11556,11536,11595,11635,11538,11455,11305,14.294239466,14.480396337,14.385461347,14.082634152,13.983324362,13.828545389,13.527664708,13.052438394,12.913259404,13.06871566,6.9894687492,7.2883844843,7.0322830329,7.1472195039,7.4937125482,7.3535837797,7.4207402038,7.6602130804,7.3258060676,7.9452196414,7.3047707169,7.1920118522,7.3531783146,6.9354146478,6.4896118134,6.474961609,6.1069245043,5.3922253134,5.5874533361,5.1234960183,1.9925103402,2.7164014786,2.6752023737,2.6403943711,2.2777481347,3.4427007254,2.5549851191,1.8214489035,1.2667539659,1.0627073344,-0.097396943,2.2018696291,3.7604411907,1.7820273228,0.5863822187,0.8645767008,-0.109742253,-1.175425324,-2.049699489,-3.334073225,1.8951133973,4.9182711076,6.4356435644,4.4224216939,2.8641303534,4.3072774261,2.4452428666,0.6460235791,-0.782945523,-2.271365891 +050,2,3,26,083,Michigan,Keweenaw County,2156,2157,2170,2180,2169,2144,2175,2124,2143,2087,2076,2085,2119,13,10,-11,-25,31,-51,19,-56,-11,9,34,2,19,18,13,25,17,22,12,17,13,12,1,22,19,18,30,15,23,36,29,19,26,1,-3,-1,-5,-5,2,-1,-24,-12,-6,-14,0,1,1,0,0,0,1,1,0,0,1,11,13,-11,-18,33,-53,20,-34,4,15,47,11,14,-10,-18,33,-53,21,-33,4,15,48,1,-1,0,-2,3,0,-1,1,-3,0,0,10,10,10,10,10,10,10,10,10,10,10,10,8.7356321839,8.2777650034,6.0282865755,11.576753878,7.9088160037,10.311694399,5.6737588652,8.1671871247,6.2484979572,5.7088487155,10.114942529,8.737640837,8.3468583353,13.892104654,6.9783670621,10.780407781,17.021276596,13.932260389,9.1324200913,12.369172217,-1.379310345,-0.459875834,-2.31857176,-2.315350776,0.9304489416,-0.468713382,-11.34751773,-5.765073264,-2.883922134,-6.660323501,0.4597701149,0.4598758335,0,0,0,0.4687133818,0.4728132388,0,0,0.475737393,5.9770114943,-5.058634169,-8.346858335,15.281315119,-24.65689695,9.3742676353,-16.07565012,1.9216910882,7.2098053353,22.359657469,6.4367816092,-4.598758335,-8.346858335,15.281315119,-24.65689695,9.8429810171,-15.60283688,1.9216910882,7.2098053353,22.835394862 +050,2,3,26,085,Michigan,Lake County,11539,11542,11514,11456,11462,11395,11399,11691,11861,11977,11850,11752,11587,-28,-58,6,-67,4,292,170,116,-127,-98,-165,24,91,99,105,89,85,118,104,110,96,87,46,156,136,162,164,157,145,170,194,183,177,-22,-65,-37,-57,-75,-72,-27,-66,-84,-87,-90,0,-1,0,3,13,1,6,6,4,1,1,-4,7,41,-12,65,356,187,176,-45,-12,-75,-4,6,41,-9,78,357,193,182,-41,-11,-74,-2,1,2,-1,1,7,4,0,-2,0,-1,397,397,355,397,397,393,577,629,619,371,267,110,7.9233783195,8.6394973383,9.1875574222,7.809072563,7.3624945864,10.020380435,8.7255642252,9.2332228145,8.1349038217,7.4553322764,13.582934262,11.868400384,14.175088594,14.389751689,13.598960589,12.313179348,14.262941522,16.284047509,15.50716041,15.167744976,-5.659555943,-3.228903046,-4.987531172,-6.580679126,-6.236466003,-2.292798913,-5.537377297,-7.050824695,-7.372256588,-7.7124127,-0.087070091,0,0.2625016406,1.1406510485,0.0866175834,0.5095108696,0.5033979361,0.3357535569,0.0847385815,0.0856934744,0.60949064,3.5779736452,-1.050006563,5.7032552426,30.83585968,15.879755435,14.766339458,-3.777227515,-1.016862978,-6.427010583,0.5224205485,3.5779736452,-0.787504922,6.8439062911,30.922477263,16.389266304,15.269737394,-3.441473958,-0.932124396,-6.341317109 +050,2,3,26,087,Michigan,Lapeer County,88319,88314,88206,88095,88200,88299,88202,88376,88227,88218,87987,87808,87635,-108,-111,105,99,-97,174,-149,-9,-231,-179,-173,229,808,838,817,799,857,789,774,773,848,815,181,781,725,774,791,853,848,918,935,876,968,48,27,113,43,8,4,-59,-144,-162,-28,-153,14,52,73,54,38,25,85,61,55,54,43,-179,-193,-78,5,-136,153,-174,81,-122,-206,-63,-165,-141,-5,59,-98,178,-89,142,-67,-152,-20,9,3,-3,-3,-7,-8,-1,-7,-2,1,0,1716,1716,1722,1720,1714,1711,1717,1697,1681,1616,1581,1487,9.1661419958,9.506792592,9.2578428206,9.0537730664,9.7067584863,8.9352955499,8.7732721245,8.773871343,9.6476008988,9.2907668018,8.8598476469,8.2248503928,8.7705879353,8.963122022,9.6614527291,9.6034608699,10.405508799,10.612638688,9.9661537586,11.034923023,0.3062943489,1.2819421992,0.4872548853,0.0906510445,0.0453057572,-0.66816532,-1.632236674,-1.838767345,-0.31855286,-1.744156222,0.5899002275,0.8281573499,0.6119014839,0.4305924612,0.2831609827,0.9626110542,0.6914335912,0.624272864,0.614351944,0.4901876963,-2.189437383,-0.884880456,0.0566575448,-1.541067756,1.732945214,-1.970521452,0.9181331293,-1.384750716,-2.343638898,-0.718181974,-1.599537155,-0.056723106,0.6685590287,-1.110475295,2.0161061967,-1.007910398,1.6095667205,-0.760477853,-1.729286954,-0.227994277 +050,2,3,26,089,Michigan,Leelanau County,21708,21711,21718,21428,21380,21475,21596,21633,21508,21638,21662,21692,21743,7,-290,-48,95,121,37,-125,130,24,30,51,38,160,166,173,163,173,178,167,165,162,143,72,198,222,243,250,245,219,243,283,238,240,-34,-38,-56,-70,-87,-72,-41,-76,-118,-76,-97,4,19,24,10,17,15,16,6,2,2,3,38,-273,-12,157,189,96,-98,202,140,104,146,42,-254,12,167,206,111,-82,208,142,106,149,-1,2,-4,-2,2,-2,-2,-2,0,0,-1,284,284,284,284,284,284,284,284,284,284,284,284,7.4166782552,7.7555597085,8.0737370202,7.5688978663,8.00388628,8.2520108481,7.7411579289,7.6212471132,7.4733588596,6.5845516289,9.1781393408,10.371893104,11.340567028,11.608739059,11.33498346,10.15275492,11.2640801,13.071593533,10.979379065,11.050995741,-1.761461086,-2.616333396,-3.266830008,-4.039841192,-3.33109718,-1.900744072,-3.522922171,-5.45034642,-3.506020206,-4.466444112,0.8807305428,1.121285741,0.4666900012,0.789394256,0.6939785792,0.7417537841,0.2781254346,0.0923787529,0.0922636896,0.1381374468,-12.65470727,-0.56064287,7.3270330183,8.7762067284,4.4414629068,-4.543241928,9.3635562972,6.4665127021,4.7977118605,6.7226890756,-11.77397673,0.5606428705,7.7937230195,9.5656009844,5.135441486,-3.801488144,9.6416817318,6.558891455,4.8899755501,6.8608265224 +050,2,3,26,091,Michigan,Lenawee County,99892,99898,99642,99370,99041,98850,98774,98432,98595,98511,98118,98519,97808,-256,-272,-329,-191,-76,-342,163,-84,-393,401,-711,261,1025,1059,1052,1076,1040,1055,1007,989,997,1012,236,943,872,1013,996,1069,1074,1058,1087,1008,1093,25,82,187,39,80,-29,-19,-51,-98,-11,-81,24,52,33,23,53,42,98,61,80,57,54,-326,-407,-554,-247,-198,-351,91,-89,-375,355,-684,-302,-355,-521,-224,-145,-309,189,-28,-295,412,-630,21,1,5,-6,-11,-4,-7,-5,0,0,0,5396,5281,5422,5528,5447,5421,5435,5489,5253,5117,5222,4956,10.300886379,10.674811376,10.63211566,10.889365664,10.54734643,10.709192141,10.217852323,10.059553779,10.140512721,10.309330861,9.4768154684,8.789835241,10.237959281,10.079747399,10.841455128,10.902059109,10.735340375,11.056354861,10.252394005,11.134484814,0.8240709103,1.8849761354,0.394156379,0.809618265,-0.294108699,-0.192866967,-0.517488052,-0.996801082,-0.111881284,-0.825153952,0.5225815529,0.3326428474,0.2324511979,0.5363721006,0.4259505289,0.9947875164,0.6189562976,0.8137151692,0.5797484705,0.5501026349,-4.090205616,-5.584367802,-2.496323734,-2.003805206,-3.55972942,0.9237312653,-0.903067385,-3.814289856,3.6107141586,-6.967966709,-3.567624063,-5.251724955,-2.263872536,-1.467433105,-3.133778891,1.9185187817,-0.284111087,-3.000574686,4.1904626291,-6.417864074 +050,2,3,26,093,Michigan,Livingston County,180967,180962,181065,182052,182805,184238,185567,187221,188585,189923,191259,192058,192335,103,987,753,1433,1329,1654,1364,1338,1336,799,277,478,1708,1707,1780,1757,1816,1795,1825,1790,1776,1710,257,1351,1315,1352,1366,1425,1415,1493,1546,1588,1766,221,357,392,428,391,391,380,332,244,188,-56,21,59,77,84,98,96,124,74,48,38,35,-140,576,314,949,869,1181,870,947,1053,576,296,-119,635,391,1033,967,1277,994,1021,1101,614,331,1,-5,-30,-28,-29,-14,-10,-15,-9,-3,2,1152,1152,1170,1317,1353,1362,1394,1384,1389,1395,1388,1398,9.4074361707,9.3570905862,9.6991360685,9.502305269,9.7428028799,9.5528011793,9.6431251123,9.391839069,9.2664817892,8.8971443289,7.4411277908,7.2083035271,7.3669842498,7.3876772894,7.6450958722,7.5304811525,7.8888689275,8.1116107266,8.2855704287,9.1885127981,1.9663083799,2.148787059,2.3321518187,2.1146279796,2.0977070077,2.0223200268,1.7542561848,1.2802283424,0.9809113606,-0.291368469,0.32496413,0.4220831723,0.4577120392,0.5300090588,0.5150380377,0.6599149561,0.3910089087,0.2518481985,0.1982693176,0.1821052933,3.1725311676,1.7212222871,5.1710562523,4.6997742053,6.3360408597,4.6300484825,5.00385725,5.5249198546,3.0053454452,1.5400904803,3.4974952977,2.1433054594,5.6287682915,5.2297832642,6.8510788974,5.2899634386,5.3948661587,5.7767680531,3.2036147627,1.7221957736 +050,2,3,26,095,Michigan,Luce County,6631,6631,6602,6524,6479,6505,6414,6431,6332,6372,6336,6266,6126,-29,-78,-45,26,-91,17,-99,40,-36,-70,-140,23,50,53,54,49,60,37,57,50,58,47,23,71,63,73,69,61,93,68,73,72,90,0,-21,-10,-19,-20,-1,-56,-11,-23,-14,-43,0,1,4,1,6,2,3,3,1,1,1,-30,-59,-38,42,-77,17,-45,48,-15,-56,-98,-30,-58,-34,43,-71,19,-42,51,-14,-55,-97,1,1,-1,2,0,-1,-1,0,1,-1,0,1211,1201,1176,1179,1211,1210,1211,1164,1209,1172,1210,1105,7.6184671644,8.1519649312,8.3179297597,7.5857264494,9.3421564811,5.7980098723,8.9735516373,7.8690588606,9.204888113,7.5855390575,10.818223373,9.690071522,11.244608749,10.681941327,9.4978590891,14.573376165,10.705289673,11.488825936,11.426757658,14.525500323,-3.199756209,-1.538106591,-2.92667899,-3.096214877,-0.155702608,-8.775366293,-1.731738035,-3.619767076,-2.221869545,-6.939961265,0.1523693433,0.6152426363,0.1540357363,0.9288644632,0.311405216,0.4701089086,0.4722921914,0.1573811772,0.1587049675,0.161394448,-8.989791254,-5.844805045,6.4695009242,-11.92042728,2.6469443363,-7.051633628,7.556675063,-2.360717658,-8.887478178,-15.81665591,-8.837421911,-5.229562409,6.6235366605,-10.99156281,2.9583495524,-6.58152472,8.0289672544,-2.203336481,-8.728773211,-15.65526146 +050,2,3,26,097,Michigan,Mackinac County,11113,11110,11104,11012,11066,11002,10990,10814,10713,10758,10790,10807,10839,-6,-92,54,-64,-12,-176,-101,45,32,17,32,26,72,85,74,90,85,79,96,76,99,95,22,138,120,132,139,155,158,138,153,150,151,4,-66,-35,-58,-49,-70,-79,-42,-77,-51,-56,0,8,15,13,27,29,40,31,25,17,11,-8,-33,72,-18,11,-136,-60,55,85,51,78,-8,-25,87,-5,38,-107,-20,86,110,68,89,-2,-1,2,-1,-1,1,-2,1,-1,0,-1,95,95,95,95,95,95,95,95,95,95,95,95,6.5111231687,7.6999728236,6.7065434113,8.1847944707,7.7967345441,7.3396200121,8.9422942574,7.0540189345,9.1679399917,8.7776032523,12.47965274,10.870549869,11.963023382,12.640960349,14.217574757,14.679240024,12.854547995,14.200853908,13.890818169,13.95176938,-5.968529571,-3.170577045,-5.256479971,-4.456165879,-6.420840213,-7.339620012,-3.912253738,-7.146834973,-4.722878178,-5.174166128,0.7234581299,1.3588187336,1.1781765452,2.4554383412,2.6600623739,3.7162632973,2.8876158539,2.3204009653,1.5742927258,1.0163540608,-2.984264786,6.5223299212,-1.63132137,1.0003637686,-12.47477527,-5.574394946,5.1231894183,7.889363282,4.7228781775,7.2068742493,-2.260806656,7.8811486548,-0.453144825,3.4558021099,-9.814712897,-1.858131649,8.0108052722,10.209764247,6.2971709034,8.2232283101 +050,2,3,26,099,Michigan,Macomb County,840978,841037,841350,844159,849761,857146,862914,865031,868329,870867,872089,872389,870791,313,2809,5602,7385,5768,2117,3298,2538,1222,300,-1598,2354,9003,9111,9125,9452,9357,9448,9337,9311,9192,9123,1872,8017,7981,8467,8249,8863,8564,8912,8957,8693,9161,482,986,1130,658,1203,494,884,425,354,499,-38,498,2538,2988,2875,2708,2420,2679,2048,1107,487,422,-636,-692,1672,3897,2026,-692,-220,117,-213,-704,-2016,-138,1846,4660,6772,4734,1728,2459,2165,894,-217,-1594,-31,-23,-188,-45,-169,-105,-45,-52,-26,18,34,7432,7432,7430,7507,7516,7525,7519,7515,7526,7519,7532,7392,10.682826375,10.757296685,10.691853745,10.990314291,10.830205823,10.901370748,10.73714521,10.684148079,10.538396013,10.46707741,9.5128533873,9.4231132521,9.9208685652,9.591525877,10.258428364,9.8813864402,10.248413635,10.277941612,9.9663051067,10.510675891,1.1699729874,1.3341834325,0.7709851796,1.3987884144,0.5717774582,1.0199843079,0.4887315748,0.4062064676,0.5720909063,-0.043598481,3.0115531866,3.5279115897,3.3686662484,3.14872737,2.8010150786,3.0911062907,2.3551112123,1.2702558183,0.5583332091,0.4841726041,-0.821116944,1.9741192028,4.5661538678,2.3557317768,-0.800951419,-0.253842249,0.1345449277,-0.244412366,-0.807118233,-2.313014147,2.1904362421,5.5020307925,7.9348201162,5.5044591468,2.0000636594,2.8372640421,2.48965614,1.0258434522,-0.248785023,-1.828841542 +050,2,3,26,101,Michigan,Manistee County,24733,24747,24587,24776,24675,24484,24415,24462,24452,24406,24479,24619,24738,-160,189,-101,-191,-69,47,-10,-46,73,140,119,67,175,179,183,186,178,236,223,198,199,198,89,289,299,342,304,309,313,342,346,303,326,-22,-114,-120,-159,-118,-131,-77,-119,-148,-104,-128,5,12,16,11,8,8,19,14,15,26,18,-157,289,9,-39,49,171,51,61,204,220,231,-152,301,25,-28,57,179,70,75,219,246,249,14,2,-6,-4,-8,-1,-3,-2,2,-2,-2,1349,1209,1383,1406,1398,1411,1414,1426,1338,1369,1367,1326,7.0903308146,7.2394895958,7.4452287475,7.6075175361,7.2835894183,9.6495890747,9.1284948217,8.1006443694,8.1062365066,8.02317807,11.709174888,12.09277871,13.914034053,12.433792102,12.643983878,12.797971951,13.99975439,14.155671474,12.342661616,13.209879045,-4.618844073,-4.853289114,-6.468805305,-4.826274566,-5.36039446,-3.148382876,-4.871259569,-6.055027104,-4.236425109,-5.186700975,0.486194113,0.6471052153,0.4475274111,0.3272050553,0.3273523334,0.7768736967,0.573089361,0.6136851795,1.0591062772,0.7293798245,11.709174888,0.3639966836,-1.586688094,2.0041309638,6.9971561266,2.0852925543,2.4970322158,8.3461184412,8.9616684997,9.360374415,12.195369001,1.0111018988,-1.139160683,2.3313360191,7.32450846,2.862166251,3.0701215768,8.9598036207,10.020774777,10.08975424 +050,2,3,26,103,Michigan,Marquette County,67077,67071,67080,67462,67840,67792,67798,67357,66563,66524,66406,66689,65834,9,382,378,-48,6,-441,-794,-39,-118,283,-855,157,636,688,650,625,621,644,599,582,574,571,170,652,590,639,667,684,679,718,684,714,727,-13,-16,98,11,-42,-63,-35,-119,-102,-140,-156,4,17,44,53,59,57,65,55,32,10,13,26,381,239,-106,5,-433,-829,29,-46,411,-711,30,398,283,-53,64,-376,-764,84,-14,421,-698,-8,0,-3,-6,-16,-2,5,-4,-2,2,-1,4757,4743,4672,4687,4677,4678,4596,3893,4018,4099,4484,3876,9.4542967995,10.169842279,9.584758759,9.2189689505,9.189449151,9.6176821983,9.0016305124,8.7564883773,8.6254179346,8.6173720788,9.6921407442,8.7212310239,9.4225551492,9.838483664,10.121712108,10.140382318,10.789934404,10.29113067,10.729178406,10.971680388,-0.237843945,1.4486112548,0.1622036098,-0.619514713,-0.932262957,-0.522700119,-1.788303891,-1.534642293,-2.103760472,-2.354308309,0.2527091912,0.6503968899,0.7815264834,0.8702706689,0.843476009,0.9707287933,0.8265270086,0.4814564056,0.1502686051,0.1961923591,5.6636589318,3.5328376521,-1.563052967,0.0737517516,-6.407458104,-12.38052569,0.43580515,-0.692093583,6.1760396709,-10.73021287,5.916368123,4.183234542,-0.781526483,0.9440224205,-5.563982095,-11.40979689,1.2623321587,-0.210637177,6.326308276,-10.53402051 +050,2,3,26,105,Michigan,Mason County,28705,28689,28719,28649,28667,28680,28748,28754,28846,29025,29121,29154,29164,30,-70,18,13,68,6,92,179,96,33,10,81,301,279,282,278,319,313,265,314,255,244,53,353,354,327,362,347,317,314,360,344,333,28,-52,-75,-45,-84,-28,-4,-49,-46,-89,-89,3,16,19,13,13,6,14,14,9,6,7,3,-34,78,50,141,32,83,215,135,118,92,6,-18,97,63,154,38,97,229,144,124,99,-4,0,-4,-5,-2,-4,-1,-1,-2,-2,0,442,442,442,448,442,442,442,442,442,442,442,442,10.493654999,9.7355014307,9.834864945,9.681688375,11.095266252,10.868055556,9.1583003577,10.800398996,8.7516087516,8.3679138516,12.306512341,12.352571708,11.404258287,12.607090618,12.069145421,11.006944444,10.851721933,12.382623052,11.806091806,11.420144724,-1.812857342,-2.617070277,-1.569393342,-2.925402243,-0.973879169,-0.138888889,-1.693421576,-1.582224057,-3.054483054,-3.052230872,0.5578022591,0.6629911369,0.4533802989,0.4527408233,0.2086883934,0.4861111111,0.4838347359,0.3095655763,0.2059202059,0.2400631023,-1.185329801,2.7217530881,1.7437703803,4.9104966219,1.1130047651,2.8819444444,7.4303191581,4.6434836446,4.0497640498,3.1551150588,-0.627527541,3.384744225,2.1971506792,5.3632374451,1.3216931585,3.3680555556,7.914153894,4.9530492209,4.2556842557,3.3951781611 +050,2,3,26,107,Michigan,Mecosta County,42798,42796,42851,43454,43502,43266,43206,43013,43174,43271,43471,43583,43907,55,603,48,-236,-60,-193,161,97,200,112,324,114,410,430,445,418,413,442,405,398,417,413,81,364,370,392,392,387,365,432,420,369,384,33,46,60,53,26,26,77,-27,-22,48,29,13,73,68,80,66,28,41,39,36,17,14,14,482,-75,-376,-144,-246,45,87,187,48,282,27,555,-7,-296,-78,-218,86,126,223,65,296,-5,2,-5,7,-8,-1,-2,-2,-1,-1,-1,3375,3375,3496,3527,3335,3336,3338,3342,3340,3343,3343,3344,9.5011876485,9.8900593404,10.257237691,9.6678693681,9.5802549322,10.256767262,9.3701197293,9.1766387678,9.5802605279,9.4410789805,8.4352007416,8.5100510603,9.0355891573,9.0665186419,8.9771396096,8.4699548656,9.9947943779,9.683890157,8.4774967262,8.7781460738,1.0659869069,1.38000828,1.221648534,0.6013507262,0.6031153226,1.7868123963,-0.624674649,-0.507251389,1.1027638018,0.6629329066,1.691674874,1.5640093841,1.8439977872,1.5265056897,0.649508809,0.9514195876,0.9023078258,0.8300477277,0.3905621798,0.3200365756,11.169688894,-1.72501035,-8.6667896,-3.330557868,-5.706398822,1.0442410108,2.0128405344,4.311636808,1.1027638018,6.446451023,12.861363768,-0.161000966,-6.822791813,-1.804052179,-5.056890013,1.9956605985,2.9151483602,5.1416845357,1.4933259816,6.7664875986 +050,2,3,26,109,Michigan,Menominee County,24029,24029,23968,23870,23736,23734,23535,23494,23217,23003,22908,22772,22608,-61,-98,-134,-2,-199,-41,-277,-214,-95,-136,-164,48,186,207,188,215,250,193,185,171,208,190,80,253,287,256,279,284,294,267,309,262,257,-32,-67,-80,-68,-64,-34,-101,-82,-138,-54,-67,0,8,17,3,-2,2,0,-1,-1,-1,2,-29,-37,-65,66,-135,-6,-177,-129,46,-79,-99,-29,-29,-48,69,-137,-4,-177,-130,45,-80,-97,0,-2,-6,-3,2,-3,1,-2,-2,-2,0,382,382,382,382,382,382,382,382,382,382,382,382,7.7762448263,8.6963828089,7.9207920792,9.0968710995,10.631737864,8.2635781722,8.0051925573,7.449195182,9.1068301226,8.373732922,10.577365274,12.057303701,10.785759427,11.804776915,12.077654213,12.588041361,11.553440069,13.460826381,11.471103327,11.326575584,-2.801120448,-3.360920892,-2.864967348,-2.707905816,-1.445916349,-4.324463189,-3.548247512,-6.011631199,-2.364273205,-2.952842662,0.3344621431,0.7141956896,0.1263956183,-0.084622057,0.0850539029,0,-0.043271311,-0.043562545,-0.043782837,0.0881445571,-1.546887412,-2.730748225,2.7807036023,-5.71198883,-0.255161709,-7.578514697,-5.581999135,2.0038770665,-3.458844133,-4.363155575,-1.212425269,-2.016552535,2.9070992206,-5.796610887,-0.170107806,-7.578514697,-5.625270446,1.9603145216,-3.50262697,-4.275011018 +050,2,3,26,111,Michigan,Midland County,83629,83623,83660,83825,83743,83683,83534,83706,83485,83442,83447,83412,83441,37,165,-82,-60,-149,172,-221,-43,5,-35,29,220,861,865,824,863,893,820,913,846,869,836,136,688,691,737,663,692,773,818,791,740,803,84,173,174,87,200,201,47,95,55,129,33,43,156,176,190,133,125,186,152,91,49,39,-88,-161,-432,-338,-484,-151,-455,-289,-138,-213,-46,-45,-5,-256,-148,-351,-26,-269,-137,-47,-164,-7,-2,-3,0,1,2,-3,1,-1,-3,0,3,1272,1272,1272,1272,1293,1289,1274,1272,1273,1274,1274,1275,10.281517748,10.324166905,9.8431545877,10.32191703,10.679263334,9.8091404442,10.938913417,10.138475274,10.415979959,10.020796749,8.215661104,8.2473980712,8.8038894795,7.9298157484,8.2755321693,9.2469092236,9.8006913202,9.479354541,8.869764292,9.6252389828,2.0658566439,2.0767688341,1.0392651082,2.3921012816,2.4037311648,0.5622312206,1.1382220971,0.6591207329,1.5462156671,0.3955577664,1.8628533899,2.1006397403,2.2696594316,1.5907473522,1.4948576895,2.2250001495,1.8211553553,1.0905452127,0.5873222301,0.4674773603,-1.922560229,-5.156115726,-4.037604673,-5.788885101,-1.805788089,-5.44287671,-3.462591432,-1.653793839,-2.553053776,-0.551383553,-0.059706839,-3.055475986,-1.767945241,-4.198137749,-0.310930399,-3.21787656,-1.641436077,-0.563248626,-1.965731546,-0.083906193 +050,2,3,26,113,Michigan,Missaukee County,14849,14851,14818,14904,15009,15059,14978,14884,15028,15020,15094,15079,15152,-33,86,105,50,-81,-94,144,-8,74,-15,73,38,164,192,180,183,162,185,195,164,165,178,55,160,134,155,179,178,165,153,157,174,176,-17,4,58,25,4,-16,20,42,7,-9,2,3,17,16,11,9,5,5,5,3,3,3,-18,65,32,16,-94,-83,120,-54,64,-8,67,-15,82,48,27,-85,-78,125,-49,67,-5,70,-1,0,-1,-2,0,0,-1,-1,0,-1,1,194,194,194,194,194,194,194,194,194,194,194,194,11.035596528,12.837227961,11.972861514,12.184971868,10.849909584,12.369617545,12.979233227,10.891943946,10.936930368,11.775991532,10.766435637,8.9593153478,10.309964081,11.918633685,11.921505592,11.032361594,10.18370607,10.4270439,11.533490206,11.64367702,0.2691608909,3.8779126132,1.6628974325,0.2663381829,-1.071596008,1.3372559508,2.7955271565,0.4649000465,-0.596559838,0.1323145116,1.1439337864,1.0697689968,0.7316748703,0.5992609115,0.3348737526,0.3343139877,0.332800852,0.1992428771,0.1988532794,0.1984717674,4.3738644775,2.1395379935,1.0642543568,-6.258947298,-5.558904293,8.0235357047,-3.594249201,4.2505147108,-0.530275412,4.4325361384,5.5177982639,3.2093069903,1.7959292271,-5.659686387,-5.22403054,8.3578496924,-3.261448349,4.4497575878,-0.331422132,4.6310079058 +050,2,3,26,115,Michigan,Monroe County,152021,152031,151936,151511,150835,150193,149919,149439,149278,149523,150218,150412,150568,-95,-425,-676,-642,-274,-480,-161,245,695,194,156,427,1595,1536,1527,1543,1501,1504,1465,1548,1485,1440,357,1289,1386,1425,1454,1418,1388,1490,1531,1580,1611,70,306,150,102,89,83,116,-25,17,-95,-171,22,72,91,85,68,25,23,0,-7,-9,-7,-190,-807,-937,-836,-420,-582,-297,281,695,299,334,-168,-735,-846,-751,-352,-557,-274,281,688,290,327,3,4,20,7,-11,-6,-3,-11,-10,-1,0,1462,1462,1462,1462,1462,1462,1462,1462,1463,1462,1462,1463,10.5125442,10.160544542,10.145235659,10.282827744,10.028126858,10.069731552,9.8058574101,10.328917299,9.8792535675,9.5687421091,8.4957175388,9.1683038638,9.4675578352,9.6897158394,9.473606852,9.2930767248,9.9731928608,10.215486036,10.511259688,10.705030235,2.0168266617,0.9922406779,0.677677824,0.5931119049,0.5545200061,0.7766548271,-0.167335451,0.1134312623,-0.63200612,-1.136288125,0.4745474498,0.6019593446,0.56473152,0.453164152,0.1670240982,0.1539919054,0,-0.04670699,-0.059874264,-0.046514719,-5.318886,-6.198196768,-5.554300597,-2.798955057,-3.888321007,-1.988504169,1.8808504657,4.6373369009,1.9891561055,2.2194165725,-4.84433855,-5.596237423,-4.989569077,-2.345790905,-3.721296909,-1.834512264,1.8808504657,4.5906299105,1.9292818415,2.1729018539 +050,2,3,26,117,Michigan,Montcalm County,63342,63342,63315,63264,63100,62801,62814,62778,62988,63553,63854,63708,63476,-27,-51,-164,-299,13,-36,210,565,301,-146,-232,214,751,718,714,738,682,727,726,697,679,711,152,597,541,640,573,588,615,623,652,635,670,62,154,177,74,165,94,112,103,45,44,41,11,36,24,10,12,8,10,3,0,-1,-1,-99,-240,-368,-396,-156,-134,93,460,256,-188,-275,-88,-204,-344,-386,-144,-126,103,463,256,-189,-276,-1,-1,3,13,-8,-4,-5,-1,0,-1,3,3163,3163,3163,3163,2925,2941,2837,2827,2876,3052,3041,2923,11.866107332,11.363996075,11.342245097,11.75018907,10.860564367,11.561153253,11.474541848,10.941314057,10.645803609,11.180651654,9.4328443107,8.5625652876,10.166718295,9.1231142778,9.3636537359,9.7800677449,9.8466109798,10.234916449,9.9559429924,10.535916467,2.4332630215,2.8014307872,1.1755268028,2.627074792,1.4969106313,1.781085508,1.6279308683,0.7063976077,0.6898606168,0.6447351868,0.5688147323,0.379855022,0.1588549734,0.1910599849,0.1273966495,0.1590254918,0.0474154622,0,-0.01567865,-0.015725248,-3.792098215,-5.824443671,-6.290656945,-2.483779803,-2.133893879,1.4789370736,7.2703708679,4.0186175014,-2.947586272,-4.324443326,-3.223283483,-5.444588649,-6.131801971,-2.292719818,-2.006497229,1.6379625654,7.3177863301,4.0186175014,-2.963264922,-4.340168575 +050,2,3,26,119,Michigan,Montmorency County,9765,9760,9778,9625,9515,9381,9324,9292,9210,9237,9260,9304,9337,18,-153,-110,-134,-57,-32,-82,27,23,44,33,16,60,77,56,64,62,75,66,64,85,82,19,153,156,164,180,134,156,163,174,162,181,-3,-93,-79,-108,-116,-72,-81,-97,-110,-77,-99,0,0,0,1,4,2,4,2,0,0,1,21,-60,-29,-25,54,37,-3,121,132,122,132,21,-60,-29,-24,58,39,1,123,132,122,133,0,0,-2,-2,1,1,-2,1,1,-1,-1,156,156,156,156,156,175,175,156,156,156,156,156,6.1846106272,8.0459770115,5.9271803556,6.8430900829,6.6609368285,8.1072316506,7.1556350626,6.9200410877,9.1575091575,8.7978112762,15.770757099,16.300940439,17.358171041,19.246190858,14.396218307,16.863041833,17.67225023,18.813861707,17.4531351,19.419559037,-9.586146472,-8.254963427,-11.43099069,-12.40310078,-7.735281478,-8.755810183,-10.51661517,-11.89382062,-8.295625943,-10.62174776,0,0,0.1058425064,0.4276931302,0.21486893,0.432385688,0.2168374261,0,0,0.1072903814,-6.184610627,-3.03030303,-2.646062659,5.7738572574,3.9750752041,-0.324289266,13.118664281,14.272584743,13.143719026,14.162330347,-6.184610627,-3.03030303,-2.540220152,6.2015503876,4.1899441341,0.108096422,13.335501708,14.272584743,13.143719026,14.269620729 +050,2,3,26,121,Michigan,Muskegon County,172188,172202,171923,170056,170191,172312,172304,172506,173342,173804,173719,173645,173883,-279,-1867,135,2121,-8,202,836,462,-85,-74,238,551,2135,2143,2102,2065,2101,2116,2080,2112,2009,2027,395,1637,1661,1671,1637,1778,1666,1737,1867,1755,1909,156,498,482,431,428,323,450,343,245,254,118,19,76,93,63,82,74,118,108,84,69,60,-475,-2456,-422,1597,-496,-173,279,20,-411,-402,51,-456,-2380,-329,1660,-414,-99,397,128,-327,-333,111,21,15,-18,30,-22,-22,-11,-9,-3,5,9,6345,6212,5204,5226,6481,6456,6454,6369,6178,5493,4748,4681,12.48614681,12.596731198,12.274345042,11.984353599,12.186421507,12.236589484,11.983430603,12.154591207,11.567116915,11.665247117,9.5736872732,9.7634953431,9.7575787657,9.5004294635,10.312925959,9.6342902084,10.007316806,10.744612587,10.104674059,10.986165144,2.912459537,2.8332358551,2.5167662765,2.4839241358,1.8734955483,2.602299276,1.9761137965,1.4099786201,1.4624428553,0.6790819733,0.4444717366,0.5466616899,0.3678799894,0.4758920073,0.4292218903,0.682380699,0.622216589,0.4834212412,0.3972777835,0.3452959186,-14.36345507,-2.480550894,9.3254657623,-2.878566288,-1.003451176,1.6134255511,0.1152252943,-2.365311073,-2.314574913,0.2935015308,-13.91898333,-1.933889204,9.6933457517,-2.402674281,-0.574229286,2.2958062501,0.7374418832,-1.881889832,-1.917297129,0.6387974494 +050,2,3,26,123,Michigan,Newaygo County,48460,48459,48373,48325,47886,47880,47798,47900,47812,48332,48914,49027,49348,-86,-48,-439,-6,-82,102,-88,520,582,113,321,120,565,552,552,533,575,522,575,538,510,499,138,471,463,483,467,491,524,496,533,513,576,-18,94,89,69,66,84,-2,79,5,-3,-77,6,14,31,20,17,11,19,14,12,6,9,-73,-155,-568,-88,-162,12,-102,428,566,110,392,-67,-141,-537,-68,-145,23,-83,442,578,116,401,-1,-1,9,-7,-3,-5,-3,-1,-1,0,-3,557,557,557,557,557,557,557,557,557,557,557,557,11.68586734,11.474779391,11.528099743,11.141537239,12.016970052,10.90772317,11.961224829,11.064722456,10.414433179,10.144853875,9.7416699415,9.6246790907,10.087087275,9.7619097389,10.26144747,10.949515212,10.317856549,10.961890463,10.475694551,11.710292249,1.9441973981,1.8501003004,1.4410124679,1.3796275006,1.7555225815,-0.041792043,1.6433682809,0.1028319931,-0.061261372,-1.565438374,0.2895613146,0.6444169586,0.4176847733,0.3553585986,0.2298898619,0.3970244066,0.2912298219,0.2467967834,0.1225227433,0.1829733164,-3.205857412,-11.80738169,-1.837813003,-3.386358411,0.2507889402,-2.131394183,8.9033116991,11.640581618,2.2462502935,7.9695044473,-2.916296097,-11.16296473,-1.420128229,-3.030999812,0.4806788021,-1.734369776,9.1945415211,11.887378401,2.3687730368,8.1524777637 +050,2,3,26,125,Michigan,Oakland County,1202362,1202388,1203125,1212718,1223723,1235656,1243076,1244895,1251563,1256478,1257472,1257726,1253459,737,9593,11005,11933,7420,1819,6668,4915,994,254,-4267,3349,13196,13330,13244,13499,13486,13720,13424,13170,13086,13035,2258,9840,9797,10185,9974,10642,10517,10562,10844,10844,11862,1091,3356,3533,3059,3525,2844,3203,2862,2326,2242,1173,1039,5355,5547,5763,6042,5748,7493,5604,3706,2702,2175,-1407,919,2217,3249,-1920,-6727,-3989,-3513,-5030,-4720,-7641,-368,6274,7764,9012,4122,-979,3504,2091,-1324,-2018,-5466,14,-37,-292,-138,-227,-46,-39,-38,-8,30,26,12496,12492,12486,12565,12650,12773,13094,13295,13385,13240,13737,13859,10.924550975,10.942189858,10.770198493,10.891859225,10.840962375,10.99157286,10.70476918,10.477535353,10.405542625,10.381552932,8.146224734,8.0420580675,8.282578651,8.0476630793,8.5547620933,8.4255373012,8.4225098394,8.6270609996,8.6227803934,9.4473326338,2.7783262406,2.9001317906,2.4876198422,2.8441961454,2.2862002813,2.5660355592,2.2822593411,1.8504743531,1.7827622318,0.9342202984,4.4332351068,4.5533628764,4.6865489215,4.8750732229,4.620632636,6.0029049157,4.4688264666,2.9483482169,2.1485386041,1.7322499139,0.7608110295,1.8198675855,2.6421303915,-1.549179177,-5.407619301,-3.195727707,-2.80138961,-4.001670678,-3.753183646,-6.085573146,5.1940461363,6.373230462,7.3286793129,3.3258940458,-0.786986665,2.8071772087,1.6674368561,-1.053322461,-1.604645042,-4.353323232 +050,2,3,26,127,Michigan,Oceana County,26570,26570,26503,26454,26302,26296,26346,26316,26327,26438,26577,26562,26819,-67,-49,-152,-6,50,-30,11,111,139,-15,257,84,340,310,320,272,300,325,267,268,259,268,97,239,246,241,253,295,287,282,274,254,280,-13,101,64,79,19,5,38,-15,-6,5,-12,2,18,40,33,37,29,69,59,55,66,52,-57,-168,-261,-117,0,-60,-94,68,89,-85,218,-55,-150,-221,-84,37,-31,-25,127,144,-19,270,1,0,5,-1,-6,-4,-2,-1,1,-1,-1,303,303,303,303,303,303,303,303,303,303,303,303,12.84060653,11.752217757,12.167763033,10.333953877,11.393414606,12.347320631,10.120344926,10.110346128,9.7480193455,10.041025833,9.0261910607,9.3259534461,9.1638465341,9.6120968048,11.203524363,10.903633911,10.688903629,10.336697161,9.5598336438,10.490624005,3.8144154692,2.4262643112,3.0039164987,0.7218570723,0.1898902434,1.44368672,-0.568558704,-0.226351033,0.1881857017,-0.449598172,0.6797968163,1.5164151945,1.2548005628,1.4057216671,1.1013634119,2.6214311494,2.2363309012,2.0748844667,2.4840512618,1.9482587437,-6.344770285,-9.894609144,-4.448838359,0,-2.278682921,-3.571225044,2.5774661234,3.3575403188,-3.199156928,8.167700118,-5.664973469,-8.37819395,-3.194037796,1.4057216671,-1.177319509,-0.949793895,4.8137970245,5.4324247854,-0.715105666,10.115958862 +050,2,3,26,129,Michigan,Ogemaw County,21699,21686,21604,21488,21356,21160,20955,20876,20857,20887,20876,20933,20923,-82,-116,-132,-196,-205,-79,-19,30,-11,57,-10,49,184,190,198,188,188,184,192,205,177,175,96,284,272,327,311,315,322,333,318,341,306,-47,-100,-82,-129,-123,-127,-138,-141,-113,-164,-131,3,13,12,15,15,12,14,10,6,5,2,-36,-28,-58,-79,-93,40,104,163,96,216,119,-33,-15,-46,-64,-78,52,118,173,102,221,121,-2,-1,-4,-3,-4,-4,1,-2,0,0,0,244,244,244,244,244,244,244,244,244,244,244,244,8.539868189,8.8693866119,9.3141405588,8.9279354149,8.9885491621,8.8179618048,9.1989267919,9.8173023969,8.4670764668,8.3620030581,13.1811009,12.69722715,15.382444256,14.769084649,15.06060099,15.431433158,15.954388655,15.228791035,16.312277261,14.621559633,-4.641232711,-3.827840538,-6.068303697,-5.841149234,-6.072051828,-6.613471354,-6.755461863,-5.411488638,-7.845200794,-6.259556575,0.6033602525,0.560171786,0.705616709,0.7123352725,0.5737371806,0.6709318765,0.4791107704,0.2873356799,0.239182951,0.0955657492,-1.299545159,-2.707496966,-3.716248001,-4.416478689,1.9124572685,4.9840653679,7.8095055577,4.5973708785,10.332703485,5.6861620795,-0.696184907,-2.14732518,-3.010631292,-3.704143417,2.4861944491,5.6549972444,8.2886163281,4.8847065584,10.571886436,5.7817278287 +050,2,3,26,131,Michigan,Ontonagon County,6780,6780,6776,6629,6414,6322,6192,6037,5935,5888,5816,5713,5656,-4,-147,-215,-92,-130,-155,-102,-47,-72,-103,-57,13,37,22,31,33,28,29,35,28,24,23,14,102,80,83,101,112,99,107,101,115,118,-1,-65,-58,-52,-68,-84,-70,-72,-73,-91,-95,0,2,1,3,5,1,2,1,1,1,0,-1,-85,-163,-44,-67,-73,-32,23,2,-12,39,-1,-83,-162,-41,-62,-72,-30,24,3,-11,39,-2,1,5,1,0,1,-2,1,-2,-1,-1,83,83,83,83,83,83,83,83,83,83,83,83,5.5203282357,3.3734570268,4.8680904523,5.2740930158,4.5792787636,4.8446374875,5.9206631143,4.7846889952,4.1634139995,4.0460902454,15.218202163,12.267116461,13.033919598,16.141921048,18.317115054,16.538590043,18.100312949,17.259056733,19.949692081,20.758202129,-9.697873928,-8.893659434,-8.165829146,-10.86782803,-13.73783629,-11.69395256,-12.17964984,-12.47436774,-15.78627808,-16.71211188,0.2983961209,0.1533389558,0.4711055276,0.7991050024,0.1635456701,0.3341129302,0.1691618033,0.1708817498,0.1734755833,0,-12.68183514,-24.99424979,-6.909547739,-10.70800703,-11.93883392,-5.345806883,3.8907214751,0.3417634997,-2.081707,6.8607617205,-12.38343902,-24.84091083,-6.438442211,-9.90890203,-11.77528825,-5.011693953,4.0598832784,0.5126452495,-1.908231416,6.8607617205 +050,2,3,26,133,Michigan,Osceola County,23528,23528,23505,23474,23327,23324,23219,23180,23179,23267,23310,23394,23466,-23,-31,-147,-3,-105,-39,-1,88,43,84,72,67,285,275,292,249,255,246,269,229,270,293,79,261,226,207,246,226,263,259,245,247,277,-12,24,49,85,3,29,-17,10,-16,23,16,0,7,7,15,15,5,14,3,4,5,4,-10,-60,-205,-102,-122,-69,3,77,55,54,53,-10,-53,-198,-87,-107,-64,17,80,59,59,57,-1,-2,2,-1,-1,-4,-1,-2,0,2,-1,455,455,455,464,461,464,464,454,454,454,454,454,12.133080738,11.751885643,12.51848835,10.699782996,10.991616199,10.612825988,11.583344099,9.8331794663,11.562178828,12.505335041,11.111347623,9.6579132925,8.8744078369,10.570869948,9.7415892584,11.346232662,11.152736511,10.520213839,10.577252484,11.822449851,1.0217331148,2.093972351,3.6440805127,0.1289130481,1.2500269402,-0.733406674,0.4306075873,-0.687034373,0.9849263446,0.6828851899,0.2980054918,0.2991389073,0.6430730317,0.6445652407,0.2155218862,0.6039819668,0.1291822762,0.1717585933,0.2141144227,0.1707212975,-2.554332787,-8.760496571,-4.372896615,-5.242463958,-2.97420203,0.1294247072,3.3156784223,2.3616806578,2.3124357657,2.2620571916,-2.256327295,-8.461357663,-3.729823584,-4.597898717,-2.758680144,0.733406674,3.4448606984,2.5334392511,2.5265501884,2.4327784891 +050,2,3,26,135,Michigan,Oscoda County,8640,8638,8601,8614,8574,8369,8311,8275,8238,8236,8249,8318,8368,-37,13,-40,-205,-58,-36,-37,-2,13,69,50,13,80,89,78,79,96,85,102,81,83,93,50,125,123,126,130,108,127,141,151,110,117,-37,-45,-34,-48,-51,-12,-42,-39,-70,-27,-24,0,2,1,2,1,1,1,1,1,2,1,0,56,-6,-164,-7,-22,3,36,82,94,74,0,58,-5,-162,-6,-21,4,37,83,96,75,0,0,-1,5,-1,-3,1,0,0,0,-1,65,65,65,65,65,65,65,65,65,65,65,65,9.2942201568,10.356062369,9.2073422652,9.4724220624,11.576027975,10.294919155,12.383149205,9.8271155596,10.019919116,11.147069399,14.522218995,14.312310915,14.873399044,15.587529976,13.023031472,15.381820384,17.117882724,18.319684562,13.279410877,14.02373247,-5.227998838,-3.956248545,-5.666056779,-6.115107914,-1.447003497,-5.086901229,-4.734733519,-8.492569002,-3.259491761,-2.876663071,0.2323555039,0.1163602513,0.2360856991,0.1199040767,0.1205836247,0.1211166959,0.1214034236,0.1213224143,0.2414438341,0.1198609613,6.5059541098,-0.698161508,-19.35902733,-0.839328537,-2.652839744,0.3633500878,4.3705232488,9.9484379739,11.347860204,8.8697111351,6.7383096137,-0.581801257,-19.12294163,-0.71942446,-2.53225612,0.4844667837,4.4919266723,10.069760388,11.589304038,8.9895720964 +050,2,3,26,137,Michigan,Otsego County,24164,24167,24150,24115,24043,24082,24115,24209,24420,24540,24675,24664,24765,-17,-35,-72,39,33,94,211,120,135,-11,101,65,267,248,230,234,267,256,240,267,232,229,76,249,223,269,239,259,277,278,251,298,315,-11,18,25,-39,-5,8,-21,-38,16,-66,-86,4,14,19,18,23,1,3,2,1,0,0,-7,-67,-116,62,21,88,228,159,119,55,188,-3,-53,-97,80,44,89,231,161,120,55,188,-3,0,0,-2,-6,-3,1,-3,-1,0,-1,348,348,348,348,348,348,347,347,347,347,347,347,11.063917953,10.299431039,9.5584415584,9.7101479345,11.050409734,10.528696868,9.8039215686,10.850350503,9.4043251789,9.2658156143,10.318035844,9.2611819428,11.179220779,9.917629728,10.719311315,11.392379033,11.35620915,10.200142233,12.079693549,12.745554229,0.7458821092,1.0382490967,-1.620779221,-0.207481793,0.331098419,-0.863682165,-1.552287582,0.6502082698,-2.67536837,-3.479738615,0.5801305294,0.7890693135,0.7480519481,0.95441625,0.0413873024,0.1233831664,0.0816993464,0.0406380169,0,0,-2.776338962,-4.817475809,2.5766233766,0.8714235326,3.6420826091,9.3771206482,6.4950980392,4.8359240069,2.2294736415,7.6068704607,-2.196208433,-4.028406495,3.3246753247,1.8258397826,3.6834699114,9.5005038146,6.5767973856,4.8765620238,2.2294736415,7.6068704607 +050,2,3,26,139,Michigan,Ottawa County,263801,263787,264114,266918,270868,274394,277888,280907,283686,286452,289578,291460,294635,327,2804,3950,3526,3494,3019,2779,2766,3126,1882,3175,912,3287,3316,3415,3363,3332,3374,3312,3280,3199,3119,425,1657,1652,1785,1832,1903,1874,1933,2062,2020,2141,487,1630,1664,1630,1531,1429,1500,1379,1218,1179,978,111,491,695,505,502,376,490,251,219,301,255,-278,692,1604,1414,1497,1241,805,1148,1699,400,1937,-167,1183,2299,1919,1999,1617,1295,1399,1918,701,2192,7,-9,-13,-23,-36,-27,-16,-12,-10,2,5,8261,8262,8321,8824,8843,8960,9057,9092,9284,9067,8703,8957,12.379668269,12.332042857,12.526088376,12.178560953,11.925661468,11.951972483,11.618239795,11.388295748,11.011328003,10.643325741,6.2406785278,6.1437077202,6.5473112009,6.6342919016,6.8110845659,6.6384103239,6.7808144695,7.1593493394,6.9530736372,7.3059828185,6.1389897407,6.188335137,5.978777175,5.544269051,5.1145769021,5.3135621589,4.8374253251,4.228946409,4.0582543655,3.3373429222,1.849229425,2.5846712261,1.8523205358,1.8179118639,1.3457529148,1.7357636386,0.8804885835,0.7603770637,1.0360768143,0.8701660994,2.6062459513,5.9651980528,5.1864975003,5.4211435462,4.4417004447,2.851611692,4.0270951945,5.8989983161,1.3768462648,6.609849939,4.4554753762,8.5498692789,7.0388180361,7.2390554101,5.7874533595,4.5873753305,4.907583778,6.6593753798,2.412923079,7.4800160384 +050,2,3,26,141,Michigan,Presque Isle County,13376,13380,13317,13151,13084,13011,12961,12800,12718,12740,12712,12602,12665,-63,-166,-67,-73,-50,-161,-82,22,-28,-110,63,25,96,85,92,93,102,84,107,100,78,93,68,202,164,199,194,195,188,228,194,197,196,-43,-106,-79,-107,-101,-93,-104,-121,-94,-119,-103,0,2,2,4,4,2,4,3,3,6,4,-18,-61,11,31,48,-68,19,139,63,5,163,-18,-59,13,35,52,-66,23,142,66,11,167,-2,-1,-1,-1,-1,-2,-1,1,0,-2,-1,230,230,230,230,230,230,230,230,230,230,230,230,7.2540426175,6.4798932723,7.0511592259,7.1615586016,7.9189472458,6.5835880555,8.4060020426,7.85792865,6.162597772,7.3613804567,15.263714674,12.502382314,15.251963978,14.939165255,15.139163852,14.734697077,17.91185482,15.244381581,15.564509757,15.514307199,-8.009672057,-6.022489041,-8.200804752,-7.777606653,-7.220216606,-8.151109021,-9.505852777,-7.386452931,-9.401911985,-8.152926742,0.1511258879,0.152468077,0.3065721403,0.3080240259,0.1552734754,0.3135041931,0.2356823003,0.2357378595,0.4740459825,0.3166185143,-4.60933958,0.8385744235,2.375934087,3.6962883105,-5.279298164,1.4891449173,10.919946579,4.9504950495,0.3950383187,12.902204456,-4.458213692,0.9910425005,2.6825062272,4.0043123364,-5.124024688,1.8026491104,11.155628879,5.186232909,0.8690843012,13.218822971 +050,2,3,26,143,Michigan,Roscommon County,24449,24448,24441,24327,24184,24021,24023,23910,23782,23738,23822,23986,23986,-7,-114,-143,-163,2,-113,-128,-44,84,164,0,58,174,182,166,148,179,162,156,161,167,159,120,398,403,383,377,405,417,435,403,392,406,-62,-224,-221,-217,-229,-226,-255,-279,-242,-225,-247,6,37,28,11,4,1,7,5,6,7,5,46,75,49,44,217,115,119,229,318,385,244,52,112,77,55,221,116,126,234,324,392,249,3,-2,1,-1,10,-3,1,1,2,-3,-2,277,277,277,277,277,289,289,277,277,277,277,277,7.1358267717,7.5034528251,6.8872523597,6.1610190659,7.4687584754,6.7935922167,6.5656565657,6.7703952902,6.9862784471,6.628866839,16.322178478,16.614788399,15.890467794,15.693947215,16.898587612,17.487209595,18.308080808,16.947014298,16.39892905,16.926540482,-9.186351706,-9.111335573,-9.003215434,-9.532928149,-9.429829137,-10.69361738,-11.74242424,-10.17661901,-9.412650602,-10.29767364,1.5173884514,1.1543773577,0.4563841925,0.1665140288,0.0417249077,0.293550281,0.2104377104,0.252312868,0.2928380187,0.208454932,3.0757874016,2.020160376,1.82553677,9.0333860628,4.7983643836,4.9903547765,9.638047138,13.372582002,16.106091031,10.172600684,4.593175853,3.1745377337,2.2819209626,9.1999000916,4.8400892913,5.2839050575,9.8484848485,13.62489487,16.39892905,10.381055616 +050,2,3,26,145,Michigan,Saginaw County,200169,200169,199871,198929,198409,196859,195317,193384,192636,192002,190841,190484,189868,-298,-942,-520,-1550,-1542,-1933,-748,-634,-1161,-357,-616,586,2229,2373,2302,2296,2165,2290,2173,2243,2139,2132,546,1994,2002,2048,2000,2094,2139,2177,2207,2208,2276,40,235,371,254,296,71,151,-4,36,-69,-144,47,195,244,231,240,218,245,172,108,88,71,-393,-1374,-1134,-2067,-2108,-2235,-1142,-800,-1309,-376,-548,-346,-1179,-890,-1836,-1868,-2017,-897,-628,-1201,-288,-477,8,2,-1,32,30,13,-2,-2,4,0,5,7116,7116,7118,7130,7139,7137,7134,7065,6894,6730,6753,6736,11.178535607,11.944490585,11.647793396,11.709028599,11.139667765,11.864670224,11.298935623,11.717597031,11.218776634,11.210668013,10,10.077062853,10.362589433,10.199502264,10.774348407,11.082327341,11.3197344,11.529530382,11.580672655,11.967861349,1.1785356068,1.8674277316,1.2852039629,1.5095263351,0.3653193586,0.7823428838,-0.020798777,0.1880666487,-0.36189602,-0.757193337,0.9779338014,1.2281734946,1.1688272261,1.2239402717,1.1216847911,1.2693642816,0.8943474124,0.5641999462,0.4615485478,0.3733383813,-6.890672016,-5.707986651,-10.45872674,-10.75027539,-11.49984178,-5.916791876,-4.159755406,-6.838312311,-1.972071068,-2.881541309,-5.912738215,-4.479813157,-9.289899511,-9.526335115,-10.37815699,-4.647427594,-3.265407994,-6.274112365,-1.51052252,-2.508202928 +050,2,3,26,147,Michigan,St. Clair County,163040,163051,162688,161586,160637,160312,160103,159757,159477,159130,159186,159339,159293,-363,-1102,-949,-325,-209,-346,-280,-347,56,153,-46,404,1625,1626,1551,1574,1568,1569,1517,1497,1540,1529,431,1676,1633,1702,1719,1783,1802,1831,1763,1747,1877,-27,-51,-7,-151,-145,-215,-233,-314,-266,-207,-348,33,113,139,132,81,52,97,67,46,43,42,-383,-1170,-1105,-289,-118,-168,-137,-94,285,320,260,-350,-1057,-966,-157,-37,-116,-40,-27,331,363,302,14,6,24,-17,-27,-15,-7,-6,-9,-3,0,1999,1999,1999,1999,1999,1999,2000,1999,1999,1998,1997,1998,10.022388474,10.092389432,9.6650869764,9.8247585163,9.8042893766,9.829780036,9.5227035188,9.4057477475,9.6695706773,9.597278365,10.336937281,10.135837603,10.606046444,10.729834746,11.148627525,11.289524299,11.493783878,11.077042938,10.969311671,11.78161641,-0.314548807,-0.043448171,-0.940959467,-0.905076229,-1.344338148,-1.459744263,-1.971080359,-1.671295191,-1.299740994,-2.184338045,0.6969414754,0.8627565382,0.8225605937,0.5055943074,0.3251422497,0.6077046931,0.420580841,0.2890209729,0.2699945059,0.2636270054,-7.216119701,-6.858604134,-1.800909179,-0.736544793,-1.050459576,-0.858304567,-0.590068643,1.7906734189,2.0092614394,1.6319767004,-6.519178226,-5.995847596,-0.978348585,-0.230950486,-0.725317326,-0.250599873,-0.169487802,2.0796943917,2.2792559454,1.8956037058 +050,2,3,26,149,Michigan,St. Joseph County,61295,61303,61288,61068,60987,60987,61014,60809,60761,60703,60808,60826,60848,-15,-220,-81,0,27,-205,-48,-58,105,18,22,215,843,840,804,810,835,748,756,742,764,755,123,625,586,638,677,660,654,680,660,618,625,92,218,254,166,133,175,94,76,82,146,130,9,46,76,40,41,15,36,7,14,27,27,-118,-486,-415,-203,-137,-393,-175,-137,12,-155,-137,-109,-440,-339,-163,-96,-378,-139,-130,26,-128,-110,2,2,4,-3,-10,-2,-3,-4,-3,0,2,765,765,765,765,765,765,765,765,764,764,764,764,13.779463206,13.764286592,13.18313739,13.278579684,13.708413025,12.305667517,12.44813278,12.212886076,12.562276995,12.410210891,10.216090752,9.6022285035,10.461245839,11.098269686,10.835392331,10.759233363,11.196733188,10.86321403,10.161632438,10.273353387,3.5633724542,4.1620580886,2.7218915507,2.1803099975,2.873020694,1.5464341532,1.2513995916,1.3496720462,2.4006445566,2.1368575045,0.7519042793,1.2453402155,0.6558774821,0.6721256383,0.2462589166,0.5922513778,0.1152604887,0.2304318128,0.4439548153,0.4438088663,-7.944032168,-6.800213019,-3.328578222,-2.24588323,-6.451983616,-2.878999753,-2.255812422,0.1975129824,-2.548629495,-2.251919062,-7.192127889,-5.554872803,-2.67270074,-1.573757592,-6.205724699,-2.286748375,-2.140551933,0.4279447951,-2.10467468,-1.808110196 +050,2,3,26,151,Michigan,Sanilac County,43114,43106,43087,42704,42306,41902,41663,41463,41438,41257,41233,41220,40747,-19,-383,-398,-404,-239,-200,-25,-181,-24,-13,-473,133,469,427,440,446,414,460,432,417,401,384,84,436,435,468,477,485,474,558,545,460,525,49,33,-8,-28,-31,-71,-14,-126,-128,-59,-141,0,4,8,11,9,11,22,15,14,26,18,-70,-421,-406,-392,-215,-136,-30,-68,94,21,-349,-70,-417,-398,-381,-206,-125,-8,-53,108,47,-331,2,1,8,5,-2,-4,-3,-2,-4,-1,-1,566,566,566,566,566,565,565,564,565,564,564,564,10.933547808,10.045876956,10.450313509,10.674325375,9.9607824267,11.097574215,10.448031925,10.110316402,9.7267534232,9.369624361,10.164236342,10.234090107,11.11533346,11.416262789,11.669032553,11.435326474,13.495374569,13.213722876,11.157871757,12.810033306,0.7693114662,-0.188213151,-0.665019951,-0.741937414,-1.708250126,-0.337752259,-3.047342645,-3.103406474,-1.431118334,-3.440408945,0.0932498747,0.1882131514,0.2612578377,0.2154011847,0.2646584703,0.5307535494,0.3627788863,0.339435083,0.6306623167,0.4392011419,-9.814549312,-9.551817433,-9.310279308,-5.145694968,-3.272141087,-0.72375484,-1.644597618,2.279064129,0.509381102,-8.515622141,-9.721299437,-9.363604282,-9.049021471,-4.930293783,-3.007482617,-0.193001291,-1.281818731,2.618499212,1.1400434187,-8.076420999 +050,2,3,26,153,Michigan,Schoolcraft County,8485,8485,8472,8476,8348,8259,8132,8118,7952,8010,8007,8081,8104,-13,4,-128,-89,-127,-14,-166,58,-3,74,23,18,70,81,64,64,57,50,74,68,70,70,31,106,107,99,141,103,99,122,121,108,120,-13,-36,-26,-35,-77,-46,-49,-48,-53,-38,-50,1,1,3,1,0,0,0,0,0,0,0,1,39,-108,-54,-50,33,-117,107,51,112,74,2,40,-105,-53,-50,33,-117,107,51,112,74,-2,0,3,-1,0,-1,0,-1,-1,0,-1,140,140,140,140,140,140,140,140,140,140,140,140,8.2605617182,9.6291012839,7.7075931836,7.8091635654,7.0153846154,6.2227753578,9.27202105,8.4909783355,8.7021382397,8.6499845536,12.508850602,12.719923918,11.922683206,17.20456348,12.676923077,12.321095208,15.286304974,15.108946744,13.426156141,14.828544949,-4.248288884,-3.090822634,-4.215090022,-9.395399915,-5.661538462,-6.098319851,-6.014283924,-6.617968409,-4.724017902,-6.178560395,0.1180080245,0.3566333809,0.1204311435,0,0,0,0,0,0,0,4.6023129573,-12.83880171,-6.503281749,-6.100909035,4.0615384615,-14.56129434,13.406841248,6.3682337516,13.923421183,9.1442693852,4.7203209818,-12.48216833,-6.382850605,-6.100909035,4.0615384615,-14.56129434,13.406841248,6.3682337516,13.923421183,9.1442693852 +050,2,3,26,155,Michigan,Shiawassee County,70648,70671,70635,70006,69345,68927,68841,68538,68589,68422,68064,68065,67738,-36,-629,-661,-418,-86,-303,51,-167,-358,1,-327,177,690,699,713,717,707,735,670,687,712,674,145,661,676,732,733,748,716,737,745,760,797,32,29,23,-19,-16,-41,19,-67,-58,-48,-123,7,13,11,15,12,15,10,8,4,2,3,-75,-674,-716,-417,-76,-276,27,-106,-304,47,-206,-68,-661,-705,-402,-64,-261,37,-98,-300,49,-203,0,3,21,3,-6,-1,-5,-2,0,0,-1,821,821,821,821,821,821,821,821,821,821,821,822,9.8122169211,10.032220795,10.313006249,10.408803205,10.292693934,10.719989499,9.7802366233,10.066966575,10.460665986,9.926143016,9.3998193983,9.7021191093,10.587826892,10.641077754,10.889582833,10.442874124,10.758260286,10.916870595,11.165879423,11.73759048,0.4123975228,0.3301016857,-0.274820643,-0.232274549,-0.596888899,0.2771153748,-0.978023662,-0.849904019,-0.705213437,-1.811447464,0.184867855,0.1578747192,0.2169636658,0.1742059114,0.2183739873,0.1458501973,0.1167789448,0.0586140703,0.0293838932,0.0441816455,-9.584687253,-10.276209,-6.03158991,-1.103304105,-4.018081366,0.3937955326,-1.547321018,-4.454669343,0.6905214906,-3.033806322,-9.399819398,-10.11833428,-5.814626244,-0.929098194,-3.799707379,0.5396457299,-1.430542073,-4.396055273,0.7199053839,-2.989624677 +050,2,3,26,157,Michigan,Tuscola County,55729,55722,55697,55400,54705,54214,53921,53723,53260,52817,52692,52355,52289,-25,-297,-695,-491,-293,-198,-463,-443,-125,-337,-66,154,505,531,569,550,585,534,537,570,528,533,104,544,517,578,557,591,597,601,632,649,708,50,-39,14,-9,-7,-6,-63,-64,-62,-121,-175,2,17,17,14,10,6,14,9,10,11,9,-78,-275,-746,-506,-298,-196,-414,-386,-72,-227,101,-76,-258,-729,-492,-288,-190,-400,-377,-62,-216,110,1,0,20,10,2,-2,0,-2,-1,0,-1,1235,1235,1235,1224,1078,1079,1078,1079,1077,1079,1078,1079,9.0911545766,9.6453385405,10.44813118,10.172469598,10.86916131,9.9828944786,10.124720722,10.80476547,10.052643103,10.18691946,9.793243742,9.3910358294,10.613391603,10.301937393,10.980639887,11.160651692,11.331391348,11.980020662,12.356373814,13.531592829,-0.702089165,0.254302711,-0.165260423,-0.129467795,-0.111478578,-1.177757214,-1.206670626,-1.175255192,-2.303730711,-3.344673369,0.3060388669,0.3087961491,0.2570717689,0.1849539927,0.1114785775,0.2617238253,0.1696880568,0.189557289,0.2094300646,0.1720117733,-4.95062873,-13.5507016,-9.29130822,-5.511628982,-3.641633533,-7.739547405,-7.277732213,-1.36481248,-4.32187497,1.9303543443,-4.644589863,-13.24190545,-9.034236451,-5.32667499,-3.530154955,-7.477823579,-7.108044157,-1.175255192,-4.112444906,2.1023661175 +050,2,3,26,159,Michigan,Van Buren County,76258,76273,76154,75941,75312,75335,75251,75087,75283,75296,75434,75594,75474,-119,-213,-629,23,-84,-164,196,13,138,160,-120,233,940,965,886,915,886,867,857,892,832,769,189,698,721,720,685,769,740,842,781,782,873,44,242,244,166,230,117,127,15,111,50,-104,12,13,100,45,58,42,81,12,11,30,37,-182,-469,-999,-184,-373,-319,-8,-9,17,83,-57,-170,-456,-899,-139,-315,-277,73,3,28,113,-20,7,1,26,-4,1,-4,-4,-5,-1,-3,4,877,877,877,877,877,877,877,877,877,877,877,877,12.360695618,12.760077486,11.76259733,12.152524139,11.786773803,11.531555496,11.382729331,11.835732767,11.017824509,10.180845712,9.1784739801,9.5336951994,9.5587698394,9.0977912953,10.2302811,9.8423887744,11.183498363,10.362900551,10.355695633,11.557709111,3.1822216378,3.2263822866,2.2038274908,3.0547328437,1.5564927031,1.6891667221,0.1992309685,1.4728322165,0.6621288768,-1.376863399,0.1709457905,1.3222878224,0.597423115,0.7703239345,0.5587409703,1.077342555,0.1593847748,0.1459563458,0.3972773261,0.4898456324,-6.167198133,-13.20965535,-2.442796737,-4.953979786,-4.243770703,-0.106404203,-0.119538581,0.225568898,1.0991339354,-0.754627055,-5.996252342,-11.88736752,-1.845373622,-4.183655851,-3.685029733,0.9709383521,0.0398461937,0.3715252438,1.4964112615,-0.264781423 +050,2,3,26,161,Michigan,Washtenaw County,344791,345417,345980,350072,352685,356474,360523,363555,366960,369703,370548,368242,366473,563,4092,2613,3789,4049,3032,3405,2743,845,-2306,-1769,975,3824,3780,3665,3748,3651,3770,3588,3578,3545,3455,548,2064,2077,2140,2165,2183,2179,2226,2398,2439,2644,427,1760,1703,1525,1583,1468,1591,1362,1180,1106,811,528,2218,2264,2362,2291,2094,2630,2113,1326,738,619,-386,120,-1330,-38,247,-491,-808,-719,-1670,-4171,-3206,142,2338,934,2324,2538,1603,1822,1394,-344,-3433,-2587,-6,-6,-24,-60,-72,-39,-8,-13,9,21,7,18087,18088,18241,18035,18209,19653,21410,22319,22584,22608,20943,20772,10.987684828,10.757630305,10.336186948,10.454715989,10.084548902,10.321485527,9.7412249563,9.6669913313,9.596773102,9.4050073838,5.9305913926,5.9110047997,6.0353178906,6.039076872,6.0297371278,5.9656543671,6.0434689946,6.4788835138,6.6026881793,7.1973486318,5.0570934355,4.846625505,4.3008690576,4.415639117,4.0548117744,4.3558311602,3.6977559617,3.1881078175,2.9940849226,2.207658752,6.3730870682,6.443194447,6.6614116157,6.3905427777,5.7839072586,7.200399718,5.7366801373,3.5825686152,1.9978613679,1.6850071116,0.3448018252,-3.785092144,-0.107169196,0.6889847517,-1.35620748,-2.212138012,-1.952045915,-4.511983098,-11.291436,-8.727193538,6.7178888934,2.6581023028,6.5542424195,7.0795275294,4.4276997782,4.9882617058,3.7846342222,-0.929414482,-9.293574629,-7.042186426 +050,2,3,26,163,Michigan,Wayne County,1820584,1820216,1814847,1803003,1795797,1780131,1771626,1764866,1760835,1757874,1755868,1750093,1740623,-5369,-11844,-7206,-15666,-8505,-6760,-4031,-2961,-2006,-5775,-9470,5918,23815,23271,23375,23724,23288,23210,23156,23338,22762,22477,4546,17969,17485,18145,17751,18398,17986,18277,18239,18351,19638,1372,5846,5786,5230,5973,4890,5224,4879,5099,4411,2839,881,4304,4642,4519,4431,4440,6013,4603,2963,1732,1461,-8068,-22100,-17876,-25958,-19183,-16159,-15286,-12450,-10075,-11944,-13795,-7187,-17796,-13234,-21439,-14752,-11719,-9273,-7847,-7112,-10212,-12334,446,106,242,543,274,69,18,7,7,26,25,23849,23831,23812,22725,22568,22614,22872,22855,22777,22725,23164,22422,13.16527772,12.932644215,13.073529445,13.359022028,13.170113208,13.166176031,13.161645365,13.283843834,12.984742272,12.87816024,9.9335240543,9.7171279315,10.148414621,9.9956162542,10.40466089,10.202793714,10.38846918,10.381524881,10.468456437,11.251559852,3.2317536659,3.2155162832,2.9251148233,3.3634057735,2.7654523183,2.9633823174,2.7731761848,2.9023189523,2.5162858343,1.626600388,2.3793136808,2.5797488052,2.5274558101,2.4951031278,2.5109628411,3.4109528857,2.616300467,1.6865210935,0.9880315269,0.8370775509,-12.21720082,-9.934422585,-14.5181894,-10.80197773,-9.138434358,-8.671183404,-7.076459008,-5.734627073,-6.813538428,-7.903822597,-9.837887143,-7.35467378,-11.99073359,-8.306874598,-6.627471517,-5.260230519,-4.460158541,-4.048105979,-5.825506901,-7.066745046 +050,2,3,26,165,Michigan,Wexford County,32735,32730,32735,32637,32518,32477,32848,32885,33086,33229,33452,33654,33743,5,-98,-119,-41,371,37,201,143,223,202,89,110,443,374,391,425,423,404,360,391,381,369,97,361,345,363,345,373,368,324,358,349,362,13,82,29,28,80,50,36,36,33,32,7,0,4,7,13,12,12,19,11,6,0,1,-4,-183,-154,-77,276,-19,148,98,184,170,81,-4,-179,-147,-64,288,-7,167,109,190,170,82,-4,-1,-1,-5,3,-6,-2,-2,0,0,0,389,389,389,389,389,389,389,389,389,389,389,389,13.553203206,11.480316169,12.031694746,13.011863758,12.870247821,12.247805854,10.85727211,11.727478592,11.355169433,10.950042287,11.044483877,10.590131226,11.170090007,10.562571757,11.348941932,11.156417214,9.7715448993,10.737691396,10.401454415,10.742317907,2.5087193294,0.8901849436,0.8616047388,2.4492920015,1.521305889,1.0913886405,1.085727211,0.9897871958,0.953715018,0.2077243794,0.1223765527,0.2148722278,0.4000307716,0.3673938002,0.3651134134,0.5760106714,0.3317499812,0.1799613083,0,0.0296749113,-5.598727284,-4.727189011,-2.369413032,8.4500574053,-0.578096238,4.4868199663,2.9555907412,5.5188134551,5.0666110333,2.403667819,-5.476350731,-4.512316783,-1.96938226,8.8174512055,-0.212982824,5.0628306377,3.2873407223,5.6987747634,5.0666110333,2.4333427304 +040,2,4,27,000,Minnesota,Minnesota,5303925,5303933,5310934,5346620,5377500,5414722,5452665,5484002,5525360,5569283,5608762,5640053,5657342,7001,35686,30880,37222,37943,31337,41358,43923,39479,31291,17289,17514,68366,68046,68951,69893,69708,70060,69233,67878,67018,66492,9355,39958,39298,41317,40793,42860,42605,43969,44588,44102,46882,8159,28408,28748,27634,29100,26848,27455,25264,23290,22916,19610,3026,12203,11609,11388,16291,16783,16581,11352,10089,9317,7360,-4048,-4868,-9125,-1363,-6742,-11877,-2458,7542,6291,-921,-9757,-1022,7335,2484,10025,9549,4906,14123,18894,16380,8396,-2397,-136,-57,-352,-437,-706,-417,-220,-235,-191,-21,76,135395,135391,136009,135722,134360,134738,134032,132526,131668,130086,129435,129373,12.829585475,12.690272022,12.777906162,12.862889672,12.74757657,12.727349687,12.480437631,12.144878644,11.915566217,11.771209204,7.4985310888,7.3288997139,7.6568106179,7.5074164562,7.8378540738,7.739776383,7.9261676108,7.9777814457,7.8411814933,8.2996124328,5.3310543864,5.3613723084,5.1210955446,5.3554732154,4.9097224959,4.9875733035,4.5542700202,4.1670971981,4.0743847241,3.4715967708,2.2900188918,2.165026128,2.110408774,2.9981448162,3.0691251731,3.0121636476,2.0463930205,1.805145712,1.6565300434,1.3029552388,-0.91353044,-1.701771334,-0.252589318,-1.240776647,-2.171959702,-0.446529054,1.359575067,1.1255993333,-0.163750582,-1.727300851,1.3764884513,0.4632547939,1.8578194555,1.7573681696,0.897165471,2.5656345935,3.4059680875,2.9307450453,1.4927794617,-0.424345612 +050,2,4,27,001,Minnesota,Aitkin County,16202,16194,16212,16170,16038,15874,15852,15857,15755,15798,15886,15841,15848,18,-42,-132,-164,-22,5,-102,43,88,-45,7,30,114,139,104,98,107,104,118,133,113,114,41,211,196,207,210,208,229,231,234,215,248,-11,-97,-57,-103,-112,-101,-125,-113,-101,-102,-134,0,3,4,0,3,0,3,2,1,2,1,30,54,-77,-60,89,106,21,156,188,56,141,30,57,-73,-60,92,106,24,158,189,58,142,-1,-2,-2,-1,-2,0,-1,-2,0,-1,-1,274,274,274,274,274,274,274,274,274,274,274,274,7.0409486752,8.6313959265,6.5179242918,6.1778982538,6.7488725598,6.5797798304,7.4794789719,8.3954046206,7.1232704006,7.194925684,13.03193132,12.17088922,12.973176235,13.238353401,13.119303668,14.48816905,14.642030869,14.770862265,13.553125098,15.652119032,-5.990982645,-3.539493294,-6.455251943,-7.060455147,-6.370431108,-7.908389219,-7.162551897,-6.375457644,-6.429854698,-8.457193348,0.185288123,0.2483854943,0,0.1891193343,0,0.1898013413,0.12677083,0.063123343,0.1260755823,0.0631133832,3.3351862146,-4.781420765,-3.760340938,5.6105402509,6.6857989845,1.3286093888,9.8881247425,11.867188486,3.5301163047,8.8989870302,3.5204743376,-4.533035271,-3.760340938,5.7996595852,6.6857989845,1.5184107301,10.014895573,11.930311829,3.656191887,8.9621004134 +050,2,4,27,003,Minnesota,Anoka County,330844,330858,331441,332921,336119,339120,341923,344244,346813,350598,354004,357538,359921,583,1480,3198,3001,2803,2321,2569,3785,3406,3534,2383,1084,4068,4065,4062,4318,4123,4353,4216,4265,4228,4224,461,1779,1729,1866,1890,2037,1995,2280,2235,2245,2430,623,2289,2336,2196,2428,2086,2358,1936,2030,1983,1794,142,424,427,387,545,521,628,441,388,365,309,-156,-1236,512,467,-117,-258,-407,1429,1006,1185,268,-14,-812,939,854,428,263,221,1870,1394,1550,577,-26,3,-77,-49,-53,-28,-10,-21,-18,1,12,3009,3009,3007,3007,3008,2979,3002,2976,2955,2959,2943,2937,12.246335582,12.151739806,12.031295586,12.680550274,12.017482624,12.598092487,12.090431611,12.10612516,11.884049009,11.774888879,5.3555140119,5.1685997848,5.5269319456,5.5503103328,5.9373301252,5.7737639587,6.5384687078,6.3440069713,6.3102388896,6.7739062441,6.8908215702,6.9831400215,6.5043636401,7.1302399408,6.0801524993,6.8243285286,5.5519629028,5.7621181887,5.5738101194,5.0009826345,1.2764125582,1.2764558173,1.1462608054,1.6004863129,1.5185807537,1.8175056471,1.2646775001,1.1013309641,1.025940844,0.8613732631,-3.720863023,1.5305512376,1.3832139435,-0.34359064,-0.752003521,-1.17790573,4.0980139401,2.8555127576,3.3307942469,0.7470810179,-2.444450465,2.8070070549,2.5294747489,1.2568956733,0.7665772327,0.6395999172,5.3626914402,3.9568437217,4.3567350908,1.608454281 +050,2,4,27,005,Minnesota,Becker County,32504,32511,32554,32766,32995,33189,33267,33455,33728,34089,34403,34461,34456,43,212,229,194,78,188,273,361,314,58,-5,100,437,427,420,427,395,422,439,401,410,398,68,359,341,324,326,340,363,349,366,332,399,32,78,86,96,101,55,59,90,35,78,-1,3,12,31,33,47,45,37,24,20,20,20,13,123,118,71,-64,91,179,248,260,-40,-24,16,135,149,104,-17,136,216,272,280,-20,-4,-5,-1,-6,-6,-6,-3,-2,-1,-1,0,0,458,458,458,458,458,458,458,458,458,458,458,458,13.38028169,12.986420523,12.691889278,12.850607921,11.840172657,12.562701874,12.946606308,11.709396718,11.907527881,11.550125513,10.992039192,10.370888521,9.7908860147,9.8110027687,10.191541021,10.806305166,10.292404559,10.687379548,9.6421933086,11.579145929,2.3882424985,2.6155320023,2.9010032636,3.0396051523,1.6486316357,1.7563967075,2.6542017488,1.0220171699,2.2653345725,-0.029020416,0.3674219228,0.9428080473,0.9972198719,1.4144697243,1.3488804292,1.1014691217,0.707787133,0.5840098114,0.5808550186,0.5804083173,3.7660747091,3.5887532124,2.1455336637,-1.926086433,2.7277359791,5.3287289939,7.3138003745,7.5921275477,-1.161710037,-0.696489981,4.133496632,4.5315612597,3.1427535356,-0.511616709,4.0766164084,6.4301981156,8.0215875076,8.1761373591,-0.580855019,-0.116081663 +050,2,4,27,007,Minnesota,Beltrami County,44442,44442,44572,45057,45160,45505,45655,45629,46054,46497,46723,47205,47442,130,485,103,345,150,-26,425,443,226,482,237,182,725,707,739,691,621,703,662,636,671,660,68,429,379,439,387,418,387,422,419,396,426,114,296,328,300,304,203,316,240,217,275,234,11,29,23,46,64,61,51,30,28,26,19,10,161,-247,6,-214,-288,63,173,-19,182,-18,21,190,-224,52,-150,-227,114,203,9,208,1,-5,-1,-1,-7,-4,-2,-5,0,0,-1,2,2079,2079,2107,2061,2033,2076,2063,2033,2092,2017,2001,2004,16.177799596,15.673320993,16.301770253,15.160157964,13.605889312,15.33544932,14.305626087,13.645140528,14.287539392,13.94655932,9.5727945196,8.4019641531,9.6840015441,8.4905660377,9.1582314535,8.4421321292,9.1192963879,8.9894872345,8.4319904608,9.0018701068,6.6050050765,7.2713568396,6.617768709,6.6695919263,4.447657859,6.8933171908,5.1863296993,4.6556532933,5.8555489311,4.9446892136,0.6471119838,0.5098817296,1.0147245354,1.4041246161,1.3364883222,1.1125290403,0.6482912124,0.6007294572,0.5536155353,0.4014918592,3.5925872207,-5.475686401,0.1323553742,-4.695041685,-6.309977652,1.3743005792,3.7384793249,-0.407637846,3.8753087471,-0.380360709,4.2396992045,-4.965804671,1.1470799096,-3.290917069,-4.97348933,2.4868296194,4.3867705373,0.1930916112,4.4289242824,0.0211311505 +050,2,4,27,009,Minnesota,Benton County,38451,38451,38465,38738,38678,38985,39147,39433,39698,40219,40569,40938,40958,14,273,-60,307,162,286,265,521,350,369,20,153,583,565,549,541,625,573,558,550,544,535,97,311,321,319,349,333,343,379,385,381,365,56,272,244,230,192,292,230,179,165,163,170,1,9,6,9,52,79,99,101,98,77,64,-43,-7,-315,74,-78,-83,-64,243,88,128,-215,-42,2,-309,83,-26,-4,35,344,186,205,-151,0,-1,5,-6,-4,-2,0,-2,-1,1,1,1048,1048,1048,1048,1048,1048,1048,1048,1049,1049,1048,1049,15.103040037,14.596465847,14.138006515,13.848359187,15.907355561,14.482314137,13.964488156,13.615883547,13.348546751,13.065351177,8.0566817352,8.2928593572,8.2149801064,8.9335995495,8.475439043,8.6691688466,9.484840522,9.5311184829,9.3488902794,8.913744261,7.0463583021,6.3036064896,5.923026409,4.9147596375,7.4319165182,5.8131452907,4.4796476344,4.0847650641,3.9996564712,4.1516069161,0.2331515615,0.155006717,0.2317705986,1.3310807352,2.0106897429,2.5021799295,2.5276224082,2.4261028866,1.8894082717,1.5629578978,-0.181340103,-8.13785264,1.9056693664,-1.996621103,-2.112496819,-1.617570864,6.0813093585,2.1785413675,3.1408345295,-5.250561688,0.0518114581,-7.982845923,2.137439965,-0.665540368,-0.101807076,0.884609066,8.6089317667,4.6046442541,5.0302428012,-3.68760379 +050,2,4,27,011,Minnesota,Big Stone County,5269,5268,5273,5206,5134,5069,5086,4993,5003,5003,4973,4967,4923,5,-67,-72,-65,17,-93,10,0,-30,-6,-44,15,57,60,55,55,52,58,56,72,61,67,9,85,88,73,73,74,71,78,80,60,73,6,-28,-28,-18,-18,-22,-13,-22,-8,1,-6,0,0,0,4,2,2,0,0,-1,-1,0,0,-37,-44,-50,33,-74,25,21,-19,-6,-37,0,-37,-44,-46,35,-72,25,21,-20,-7,-37,-1,-2,0,-1,0,1,-2,1,-2,0,-1,137,137,137,137,137,137,137,137,137,137,137,137,10.878900658,11.605415861,10.781142801,10.832102413,10.318483977,11.604641857,11.19328403,14.434643144,12.273641851,13.549039434,16.222922035,17.021276596,14.309516809,14.377154111,14.683996428,14.205682273,15.590645613,16.038492382,12.072434608,14.762386249,-5.344021376,-5.415860735,-3.528374008,-3.545051699,-4.365512452,-2.601040416,-4.397361583,-1.603849238,0.2012072435,-1.213346815,0,0,0.7840831128,0.3938946332,0.3968647683,0,0,-0.200481155,-0.201207243,0,-7.061742533,-8.510638298,-9.80103891,6.4992614476,-14.68399643,5.0020008003,4.1974815111,-3.809141941,-1.207243461,-7.482305359,-7.061742533,-8.510638298,-9.016955797,6.8931560807,-14.28713166,5.0020008003,4.1974815111,-4.009623095,-1.408450704,-7.482305359 +050,2,4,27,013,Minnesota,Blue Earth County,64013,64013,64091,64364,64979,64749,65320,65701,66398,66931,67397,67874,68241,78,273,615,-230,571,381,697,533,466,477,367,207,766,763,725,740,699,767,720,696,737,724,95,475,464,477,466,485,479,512,526,485,497,112,291,299,248,274,214,288,208,170,252,227,25,101,80,87,204,203,174,119,109,97,94,-57,-119,244,-578,104,-26,235,207,188,127,41,-32,-18,324,-491,308,177,409,326,297,224,135,-2,0,-8,13,-11,-10,0,-1,-1,1,5,4529,4530,4558,4584,4012,4082,4155,4168,4066,3937,4149,4150,11.926355533,11.798087256,11.177232363,11.378575987,10.67004526,11.612502744,10.800351011,10.362694301,10.896644514,10.638063402,7.3955860029,7.174721477,7.3538480513,7.1654275807,7.4033933492,7.2521366551,7.6802496081,7.8315764398,7.1707904872,7.3026484958,4.5307695302,4.6233657794,3.8233843118,4.2131484058,3.2666519108,4.3603660891,3.1201014033,2.5311178608,3.7258540264,3.3354149065,1.572535129,1.2370209443,1.3412678836,3.1367966233,3.0987398967,2.6343878455,1.7850580144,1.6228932166,1.4341580974,1.3811850274,-1.852788914,3.7729138801,-8.910952146,1.5991512197,-0.396882942,3.5579376074,3.1051009158,2.7991185754,1.8777121482,0.6024317673,-0.280253785,5.0099348245,-7.569684262,4.7359478431,2.7018569542,6.1923254529,4.8901589302,4.422011792,3.3118702457,1.9836167946 +050,2,4,27,015,Minnesota,Brown County,25893,25893,25844,25660,25413,25267,25274,25246,25278,25173,25118,24965,24846,-49,-184,-247,-146,7,-28,32,-105,-55,-153,-119,58,251,290,255,292,262,296,300,242,275,257,85,282,277,321,302,311,268,314,289,294,309,-27,-31,13,-66,-10,-49,28,-14,-47,-19,-52,1,6,4,8,19,19,10,6,6,5,5,-22,-159,-270,-88,1,5,-4,-95,-14,-139,-71,-21,-153,-266,-80,20,24,6,-89,-8,-134,-66,-1,0,6,0,-3,-3,-2,-2,0,0,-1,1111,1111,1111,1085,1115,1125,1128,1112,1117,1135,1108,1111,9.7468157813,11.356293932,10.063141279,11.554975169,10.37212985,11.717203705,11.892727597,9.6239883876,10.981770261,10.319005842,10.950605778,10.847218687,12.667719021,11.950693496,12.311955661,10.608819571,12.447721552,11.493110099,11.740510752,12.406898075,-1.203789997,0.5090752452,-2.604577743,-0.395718328,-1.939825812,1.1083841343,-0.554993955,-1.869121712,-0.758740491,-2.087892233,0.2329916123,0.156638537,0.3157063931,0.7518648226,0.7521773555,0.3958514765,0.2378545519,0.2386112823,0.1996685502,0.2007588685,-6.174277726,-10.57310125,-3.472770324,0.0395718328,0.1979414093,-0.158340591,-3.766030406,-0.556759659,-5.550785696,-2.850775933,-5.941286114,-10.41646271,-3.157063931,0.7914366554,0.9501187648,0.2375108859,-3.528175854,-0.318148376,-5.351117146,-2.650017065 +050,2,4,27,017,Minnesota,Carlton County,35386,35384,35413,35436,35264,35265,35357,35400,35550,35498,35816,35913,35769,29,23,-172,1,92,43,150,-52,318,97,-144,103,365,385,362,357,360,362,362,361,372,367,74,351,345,392,387,393,392,388,378,355,393,29,14,40,-30,-30,-33,-30,-26,-17,17,-26,0,7,5,3,14,19,12,7,4,2,5,3,5,-219,33,116,60,171,-30,331,77,-124,3,12,-214,36,130,79,183,-23,335,79,-119,-3,-3,2,-5,-8,-3,-3,-3,0,1,1,1984,1984,2005,2031,2050,1992,2000,1985,1994,1999,1991,1992,10.303603438,10.891089109,10.265280948,10.110163972,10.175671665,10.204369274,10.190293886,10.12423928,10.372373796,10.239669652,9.9083967311,9.7595473833,11.115994839,10.959757583,11.108441568,11.050035236,10.922193447,10.60100401,9.8983674664,10.96509584,0.3952067072,1.1315417256,-0.850713891,-0.849593611,-0.932769903,-0.845665962,-0.731899561,-0.476764731,0.4740063294,-0.725426188,0.1976033536,0.1414427157,0.0850713891,0.3964770185,0.5370493379,0.3382663848,0.1970498818,0.1121799366,0.0557654505,0.1395050361,0.1411452526,-6.195190948,0.9357852798,3.2850952961,1.6959452775,4.8202959831,-0.844499493,9.2828897552,2.1469698448,-3.459724896,0.3387486062,-6.053748232,1.0208566689,3.6815723146,2.2329946154,5.1585623679,-0.647449612,9.3950696918,2.2027352953,-3.32021986 +050,2,4,27,019,Minnesota,Carver County,91042,91014,91332,92752,93804,95562,97321,98610,100389,102120,103605,105128,106565,318,1420,1052,1758,1759,1289,1779,1731,1485,1523,1437,313,1106,1097,1131,1164,1176,1216,1170,1174,1159,1154,124,424,402,486,435,465,498,549,500,586,618,189,682,695,645,729,711,718,621,674,573,536,23,77,55,67,87,93,100,58,45,40,42,107,662,316,1041,942,495,966,1059,772,914,857,130,739,371,1108,1029,588,1066,1117,817,954,899,-1,-1,-14,5,1,-10,-5,-7,-6,-4,2,836,836,977,922,970,965,917,885,907,876,877,856,12.01625345,11.760543751,11.945122144,12.069492905,12.004225978,12.221166941,11.555041998,11.413294446,11.105095984,10.902580624,4.6065926425,4.3096978923,5.1329172079,4.5105063691,4.7465689452,5.0050502766,5.4219812453,4.8608579414,5.614828513,5.8386436963,7.409660807,7.4508458586,6.8122049365,7.5589865359,7.2576570323,7.2161166639,6.1330607529,6.552436505,5.4902674709,5.0639369275,0.8365746072,0.5896352838,0.7076243887,0.9021012738,0.949313789,1.005030176,0.5728140478,0.4374772147,0.3832647449,0.3968010279,7.1923687012,3.3877227213,10.994581921,9.7675793097,5.0527991997,9.7085915005,10.458794424,7.5051646616,8.7575994213,8.0966304979,8.0289433085,3.9773580051,11.702206309,10.669680584,6.0021129888,10.713621676,11.031608472,7.9426418763,9.1408641662,8.4934315258 +050,2,4,27,021,Minnesota,Cass County,28567,28567,28654,28383,28412,28488,28559,28704,29030,29324,29405,29622,29928,87,-271,29,76,71,145,326,294,81,217,306,96,295,363,320,370,359,323,292,304,271,275,53,282,290,318,322,345,311,343,337,292,347,43,13,73,2,48,14,12,-51,-33,-21,-72,0,11,7,9,12,18,7,3,4,2,1,44,-295,-46,68,11,113,307,343,111,236,381,44,-284,-39,77,23,131,314,346,115,238,382,0,0,-5,-3,0,0,0,-1,-1,0,-4,223,223,223,223,223,223,223,223,223,224,223,223,10.344162561,12.782815389,11.247803163,12.971760128,12.538637515,11.189247237,10.007882921,10.352636687,9.1822386366,9.2359361881,9.8883181093,10.212166564,11.177504394,11.288937192,12.049665578,10.77354765,11.755835076,11.476442643,9.8937774239,11.654072208,0.4558444518,2.5706488247,0.0702987698,1.6828229355,0.4889719365,0.4156995878,-1.747952154,-1.123805956,-0.711538787,-2.41813602,0.3857145362,0.2465005722,0.316344464,0.4207057339,0.6286782041,0.2424914262,0.1028207149,0.1362189038,0.0677655988,0.0335852225,-10.34416256,-1.619860903,2.3901581722,0.3856469227,3.9467020589,10.63498112,11.755835076,3.7800745798,7.9963406577,12.795969773,-9.958448025,-1.373360331,2.7065026362,0.8063526566,4.575380263,10.877472547,11.858655791,3.9162934836,8.0641062565,12.829554996 +050,2,4,27,023,Minnesota,Chippewa County,12441,12436,12439,12308,12112,12060,12041,12069,12035,11948,11879,11756,11758,3,-131,-196,-52,-19,28,-34,-87,-69,-123,2,39,157,153,148,173,162,183,150,163,151,147,46,135,154,161,144,154,149,149,186,150,141,-7,22,-1,-13,29,8,34,1,-23,1,6,3,16,23,20,28,37,25,32,36,23,18,8,-170,-222,-62,-74,-17,-93,-121,-83,-146,-22,11,-154,-199,-42,-46,20,-68,-89,-47,-123,-4,-1,1,4,3,-2,0,0,1,1,-1,0,237,237,237,237,237,237,237,237,237,237,237,237,12.688406676,12.530712531,12.245573391,14.356250778,13.4384073,15.184201792,12.508860443,13.681957443,12.77766025,12.503189589,10.910413383,12.612612613,13.32119808,11.94971163,12.774782248,12.363093263,12.42546804,15.612540395,12.693039983,11.99285532,1.7779932921,-0.081900082,-1.07562469,2.4065391478,0.6636250518,2.8211085297,0.083392403,-1.930582952,0.0846202666,0.5103342689,1.2930860306,1.8837018837,1.654807215,2.3235550392,3.0692658648,2.0743445071,2.6685568945,3.021782012,1.9462661307,1.5310028068,-13.73903908,-18.18181818,-5.129902366,-6.140824032,-1.410203235,-7.716561567,-10.09048076,-6.966886305,-12.35455892,-1.871225653,-12.44595304,-16.2981163,-3.475095151,-3.817268993,1.6590626296,-5.642217059,-7.421923863,-3.945104293,-10.40829279,-0.340222846 +050,2,4,27,025,Minnesota,Chisago County,53887,53892,53905,53762,53468,53665,53808,54144,54640,55261,55980,56543,56794,13,-143,-294,197,143,336,496,621,719,563,251,136,549,572,539,522,564,582,589,563,627,593,68,361,350,383,403,438,379,445,431,459,456,68,188,222,156,119,126,203,144,132,168,137,6,21,14,13,16,26,36,22,22,16,19,-62,-354,-540,31,15,190,262,459,567,379,93,-56,-333,-526,44,31,216,298,481,589,395,112,1,2,10,-3,-7,-6,-5,-4,-2,0,2,1673,1673,1673,1672,1661,1676,1688,1680,1675,1680,1677,1676,10.198110842,10.66865616,10.062259061,9.7140677193,10.449088484,10.700102956,10.718737773,10.122167187,11.144388258,10.464367329,6.7058615918,6.5280238739,7.1499911325,7.4995580285,8.1147176523,6.9679364612,8.0981974686,7.7489414874,8.1583320743,8.0467984859,3.49224925,4.1406322857,2.9122679286,2.2145096908,2.3343708315,3.7321664951,2.6205403045,2.3732256992,2.9860561841,2.4175688434,0.3900916715,0.261120955,0.2426889941,0.2977492021,0.4816955684,0.6618620385,0.4003603243,0.3955376165,0.2843863032,0.3352832702,-6.575831035,-10.07180826,0.5787199089,0.279139877,3.5200829999,4.816884836,8.3529722205,10.194083117,6.7364005581,1.6411233754,-6.185739363,-9.810687308,0.821408903,0.5768890791,4.0017785683,5.4787468745,8.7533325447,10.589620733,7.0207868614,1.9764066457 +050,2,4,27,027,Minnesota,Clay County,58999,58994,59144,59937,60229,60567,61297,62235,63090,63844,64079,64441,64690,150,793,292,338,730,938,855,754,235,362,249,201,793,791,781,846,869,852,937,851,864,839,117,459,423,503,443,462,471,516,497,379,420,84,334,368,278,403,407,381,421,354,485,419,20,75,62,74,156,161,188,128,108,111,94,47,382,-132,-11,180,376,290,209,-228,-236,-266,67,457,-70,63,336,537,478,337,-120,-125,-172,-1,2,-6,-3,-9,-6,-4,-4,1,2,2,3743,3743,3873,3873,3671,3563,3410,3152,3187,2920,2916,2917,13.318665446,13.165121582,12.930891751,13.884330073,14.069229026,13.596648713,14.763577922,13.304878716,13.445378151,12.994555916,7.7090383856,7.0402609723,8.3280903341,7.2703997899,7.4798432795,7.5164572113,8.1302094002,7.7702993207,5.8979147214,6.5050220319,5.6096270606,6.1248606095,4.6028014173,6.6139302829,6.5893857462,6.0801915021,6.6333685222,5.5345793954,7.5474634298,6.4895338842,1.259646795,1.0319058636,1.2252061327,2.5602310773,2.6066120519,3.0001994813,2.0167961303,1.6885157478,1.7273576097,1.4558858833,6.4158010094,-2.196960871,-0.182125236,2.9541127815,6.0874915002,4.6279672851,3.2930499315,-3.564644356,-3.672580143,-4.119847287,7.6754478044,-1.165055007,1.0430808967,5.5143438587,8.6941035521,7.6281667664,5.3098460617,-1.876128609,-1.945222533,-2.663961404 +050,2,4,27,029,Minnesota,Clearwater County,8695,8695,8705,8723,8679,8784,8787,8794,8838,8842,8815,8843,9017,10,18,-44,105,3,7,44,4,-27,28,174,23,121,94,111,95,115,113,116,108,104,106,12,96,94,105,104,118,98,96,111,71,87,11,25,0,6,-9,-3,15,20,-3,33,19,0,2,0,6,6,6,8,5,4,5,3,0,-8,-43,92,7,5,20,-21,-26,-11,153,0,-6,-43,98,13,11,28,-16,-22,-6,156,-1,-1,-1,1,-1,-1,1,0,-2,1,-1,115,115,115,115,115,115,115,115,115,115,115,115,13.885701171,10.803355936,12.712592338,10.813271868,13.082304761,12.817604356,13.122171946,12.233108682,11.779363461,11.870100784,11.016754648,10.803355936,12.025425185,11.837687098,13.423582276,11.11615245,10.859728507,12.572917257,8.0416808246,9.7424412094,2.8689465228,0,0.6871671534,-1.02441523,-0.341277515,1.7014519056,2.2624434389,-0.339808575,3.7376826368,2.1276595745,0.2295157218,0,0.6871671534,0.6829434864,0.682555031,0.9074410163,0.5656108597,0.4530780993,0.566315551,0.3359462486,-0.918062887,-4.941960694,10.536563019,0.7967674008,0.5687958592,2.2686025408,-2.375565611,-2.945007646,-1.245894212,17.133258679,-0.688547165,-4.941960694,11.223730172,1.4797108873,1.2513508902,3.1760435572,-1.809954751,-2.491929546,-0.679578661,17.469204927 +050,2,4,27,031,Minnesota,Cook County,5176,5176,5161,5210,5181,5188,5246,5249,5346,5413,5413,5416,5417,-15,49,-29,7,58,3,97,67,0,3,1,6,46,50,42,38,51,58,50,43,34,37,16,41,39,52,50,43,45,61,55,40,49,-10,5,11,-10,-12,8,13,-11,-12,-6,-12,0,5,7,10,23,35,31,20,16,16,11,-4,39,-47,7,45,-41,54,57,-3,-6,3,-4,44,-40,17,68,-6,85,77,13,10,14,-1,0,0,0,2,1,-1,1,-1,-1,-1,51,51,51,51,51,51,51,51,51,51,51,51,8.8708899817,9.6237128284,8.1010704986,7.2838796243,9.7189137685,10.948560642,9.2945441026,7.9438389063,6.2794348509,6.8309794148,7.9066628098,7.5064960062,10.029896808,9.5840521372,8.1943782754,8.4945729118,11.339343805,10.160724183,7.3875704128,9.0464321979,0.9642271719,2.1172168223,-1.928826309,-2.300172513,1.5245354931,2.4539877301,-2.044799703,-2.216885276,-1.108135562,-2.215452783,0.9642271719,1.347319796,1.9288263092,4.4086639831,6.6698427823,5.8518168948,3.717817641,2.9558470349,2.9550281651,2.0308317179,7.520971941,-9.046290059,1.3501784164,8.6256469235,-7.813244402,10.193487494,10.595780277,-0.554221319,-1.108135562,0.5538631958,8.4851991129,-7.698970263,3.2790047256,13.034310907,-1.14340162,16.045304389,14.313597918,2.4016257159,1.8468926032,2.5846949137 +050,2,4,27,033,Minnesota,Cottonwood County,11687,11687,11715,11716,11578,11558,11513,11431,11382,11263,11274,11232,11242,28,1,-138,-20,-45,-82,-49,-119,11,-42,10,33,161,160,147,160,153,155,129,146,138,137,23,137,142,129,134,141,133,137,143,133,152,10,24,18,18,26,12,22,-8,3,5,-15,1,12,0,5,11,3,2,5,6,1,2,19,-34,-158,-42,-84,-97,-73,-117,4,-47,24,20,-22,-158,-37,-73,-94,-71,-112,10,-46,26,-2,-1,2,-1,2,0,0,1,-2,-1,-1,244,244,244,244,244,244,244,244,244,244,244,244,13.742477914,13.737443118,12.70746888,13.870226692,13.336820084,13.58874326,11.393243542,12.95647158,12.263396428,12.191866156,11.693909778,12.191980768,11.151452282,11.616314854,12.290794979,11.660018411,12.099801281,12.690242712,11.81907047,13.526742013,2.0485681362,1.5454623508,1.5560165975,2.2539118374,1.0460251046,1.9287248499,-0.706557739,0.2662288681,0.4443259575,-1.334875857,1.0242840681,0,0.4322268326,0.953578085,0.2615062762,0.1753386227,0.4415985869,0.5324577362,0.0888651915,0.1779834475,-2.902138193,-13.56572508,-3.630705394,-7.281869013,-8.455369596,-6.399859729,-10.33340693,0.3549718241,-4.176664001,2.1358013705,-1.877854125,-13.56572508,-3.198478562,-6.328290928,-8.193863319,-6.224521106,-9.891808346,0.8874295603,-4.087798809,2.313784818 +050,2,4,27,035,Minnesota,Crow Wing County,62500,62512,62608,62679,62813,63008,63121,63255,63757,64324,64957,65191,65644,96,71,134,195,113,134,502,567,633,234,453,206,752,728,720,701,705,707,714,666,625,639,159,601,642,678,622,650,631,744,715,701,743,47,151,86,42,79,55,76,-30,-49,-76,-104,9,20,42,30,30,24,24,23,23,22,18,46,-98,20,131,20,63,406,573,662,288,541,55,-78,62,161,50,87,430,596,685,310,559,-6,-2,-14,-8,-16,-8,-4,1,-3,0,-2,750,750,743,741,742,746,740,736,736,736,736,736,12.004437811,11.602333216,11.444830354,11.115603866,11.157181743,11.132806349,11.14919465,10.303138125,9.6044503181,9.7680284328,9.5939722397,10.231727919,10.77721525,9.8629181235,10.286763309,9.9360690328,11.617648207,11.061176816,10.772351477,11.357817098,2.410465571,1.3706052975,0.667615104,1.2526857424,0.8704184339,1.1967373162,-0.468453557,-0.758038691,-1.167901159,-1.589788665,0.3192669631,0.6693653779,0.4768679314,0.4757034465,0.379818953,0.3779170472,0.3591477268,0.3558140794,0.3380766512,0.2751557305,-1.564408119,0.318745418,2.0823233006,0.317135631,0.9970247515,6.3930967153,8.9474629336,10.241257416,4.4257307066,8.2699583445,-1.245141156,0.9881107959,2.559191232,0.7928390775,1.3768437045,6.7710137625,9.3066106604,10.597071495,4.7638073578,8.545114075 +050,2,4,27,037,Minnesota,Dakota County,398552,398582,399214,401804,404669,407974,411821,414245,417783,421840,425472,429453,431807,632,2590,2865,3305,3847,2424,3538,4057,3632,3981,2354,1322,5126,5220,5155,5294,5307,5310,5191,5087,5252,5167,482,2268,2134,2317,2326,2469,2422,2674,2589,2764,2995,840,2858,3086,2838,2968,2838,2888,2517,2498,2488,2172,188,545,578,506,809,915,908,635,570,472,385,-407,-811,-771,8,122,-1318,-246,930,580,1019,-221,-219,-266,-193,514,931,-403,662,1565,1150,1491,164,11,-2,-28,-47,-52,-11,-12,-25,-16,2,18,2853,2853,2848,2851,2844,2840,2832,2831,2827,2825,2824,2815,12.798713637,12.945256692,12.686997858,12.915423978,12.848852271,12.763993519,12.365073372,12.007383349,12.286457876,11.99869958,5.6627940945,5.2921796514,5.7023809963,5.6745893791,5.977730593,5.8219194546,6.3695253703,6.1110901297,6.4660642746,6.954926503,7.1359195424,7.6530770404,6.9846168613,7.2408345989,6.8711216779,6.9420740648,5.9955480019,5.896293219,5.8203936018,5.0437730767,1.3607684222,1.4334019862,1.2453192853,1.9736641477,2.215319357,2.1826188542,1.5125836238,1.3454311989,1.1041904261,0.8940389662,-2.024923285,-1.912029293,0.0196888425,0.2976353845,-3.19102832,-0.591326253,2.215279953,1.369035255,2.3838348393,-0.513201588,-0.664154863,-0.478627307,1.2650081278,2.2712995322,-0.975708963,1.5912926007,3.7278635769,2.7144664539,3.4880252654,0.3808373778 +050,2,4,27,039,Minnesota,Dodge County,20087,20087,20157,20204,20273,20341,20390,20417,20558,20708,20804,20976,20987,70,47,69,68,49,27,141,150,96,172,11,73,264,263,236,239,268,267,226,246,252,256,25,125,133,138,142,163,143,154,162,158,159,48,139,130,98,97,105,124,72,84,94,97,3,17,18,20,19,13,8,9,9,8,6,22,-109,-82,-49,-69,-90,11,71,4,69,-92,25,-92,-64,-29,-50,-77,19,80,13,77,-86,-3,0,3,-1,2,-1,-2,-2,-1,1,0,149,149,149,149,149,149,149,149,149,149,149,149,13.081935532,12.995034217,11.621608312,11.735533132,13.135001348,13.032336791,10.953327194,11.851994604,12.063188128,12.201224889,6.1940982632,6.5716332732,6.7956862166,6.9725761705,7.9888254466,6.9798657718,7.463771628,7.8049720563,7.5634274773,7.5781045206,6.8878372687,6.4234009437,4.8259220958,4.7629569615,5.1461759012,6.0524710189,3.4895555663,4.0470225477,4.499760651,4.6231203679,0.8423973638,0.8893939768,0.9848820604,0.9329503327,0.6371455878,0.3904820012,0.4361944458,0.4336095587,0.3829583533,0.2859662083,-5.401253685,-4.051683672,-2.412961048,-3.388082787,-4.411007915,0.5369127517,3.4410895168,0.1927153594,3.303015797,-4.384815194,-4.558856322,-3.162289695,-1.428078988,-2.455132454,-3.773862328,0.9273947529,3.8772839626,0.6263249181,3.6859741503,-4.098848986 +050,2,4,27,041,Minnesota,Douglas County,36009,36011,35990,36185,36297,36350,36579,36796,37162,37547,37987,38070,38328,-21,195,112,53,229,217,366,385,440,83,258,100,383,401,406,418,424,420,417,467,405,415,101,380,379,412,373,395,449,436,442,431,473,-1,3,22,-6,45,29,-29,-19,25,-26,-58,4,15,11,12,2,3,15,13,10,11,8,-19,177,84,55,185,188,382,391,407,99,310,-15,192,95,67,187,191,397,404,417,110,318,-5,0,-5,-8,-3,-3,-2,0,-2,-1,-2,522,522,522,522,522,522,522,522,522,522,522,522,10.613093176,11.064816092,11.177336986,11.463203938,11.557069847,11.357797669,11.163313657,12.365292451,10.649907306,10.864158748,10.529961898,10.457768825,11.342519306,10.229126959,10.766609881,12.142026556,11.671953848,11.703338894,11.333605059,12.382523103,0.0831312781,0.6070472669,-0.16518232,1.234076979,0.7904599659,-0.784228887,-0.508640191,0.6619535573,-0.683697753,-1.518364355,0.4156563907,0.3035236335,0.33036464,0.0548478657,0.0817717206,0.405635631,0.3480169725,0.2647814229,0.2892567417,0.2094295662,4.9047454105,2.3178168373,1.5141712665,5.0734275802,5.1243611584,10.330187404,10.467279712,10.776603913,2.6033106749,8.115395691,5.3204018012,2.6213404707,1.8445359065,5.128275446,5.206132879,10.735823035,10.815296684,11.041385336,2.8925674165,8.3248252572 +050,2,4,27,043,Minnesota,Faribault County,14553,14553,14479,14460,14174,14098,14102,13977,13864,13767,13732,13671,13601,-74,-19,-286,-76,4,-125,-113,-97,-35,-61,-70,26,150,136,154,151,150,157,151,136,156,143,59,193,202,204,172,189,178,190,195,164,160,-33,-43,-66,-50,-21,-39,-21,-39,-59,-8,-17,0,0,1,2,0,-1,1,0,0,0,0,-42,24,-224,-27,25,-85,-93,-58,25,-54,-53,-42,24,-223,-25,25,-86,-92,-58,25,-54,-53,1,0,3,-1,0,0,0,0,-1,1,0,336,336,336,336,336,336,336,336,336,336,336,336,10.366633263,9.4991967591,10.894170911,10.709219858,10.684141173,11.27833052,10.929752814,9.8912687734,11.385614714,10.486946319,13.338401465,14.109101069,14.431239389,12.19858156,13.462017878,12.786897022,13.752669104,14.182333903,11.969492391,11.733646231,-2.971768202,-4.60990431,-3.537068478,-1.489361702,-2.777876705,-1.508566503,-2.82291629,-4.29106513,-0.583877678,-1.246699912,0,0.069847035,0.1414827391,0,-0.071227608,0.0718365001,0,0,0,0,1.6586613221,-15.64573584,-1.910016978,1.7730496454,-6.054346665,-6.680794512,-4.1981832,1.8182479363,-3.941174324,-3.886770314,1.6586613221,-15.5758888,-1.768534239,1.7730496454,-6.125574273,-6.608958012,-4.1981832,1.8182479363,-3.941174324,-3.886770314 +050,2,4,27,045,Minnesota,Fillmore County,20866,20870,20864,20836,20833,20753,20769,20737,20912,20976,21053,21081,21135,-6,-28,-3,-80,16,-32,175,64,77,28,54,63,251,243,237,278,242,259,271,260,254,245,29,244,243,226,236,244,238,227,241,226,242,34,7,0,11,42,-2,21,44,19,28,3,0,10,12,20,21,35,28,19,23,16,15,-40,-43,-14,-111,-46,-63,127,2,36,-15,36,-40,-33,-2,-91,-25,-28,155,21,59,1,51,0,-2,-1,0,-1,-2,-1,-1,-1,-1,0,359,359,359,359,359,359,359,359,359,360,359,359,12.038369305,11.663346853,11.398066657,13.390491787,11.66096468,12.437273404,12.939266616,12.372409527,12.056771254,11.606973659,11.70263789,11.663346853,10.869042466,11.367467848,11.757336289,11.428845831,10.83842628,11.468271907,10.72767836,11.464847451,0.3357314149,0,0.5290241908,2.0230239391,-0.096371609,1.0084275733,2.1008403361,0.9041376193,1.3290928941,0.1421262081,0.479616307,0.5759677458,0.9618621652,1.0115119696,1.6865031562,1.3445700977,0.9071810542,1.0944823812,0.7594816538,0.7106310404,-2.06235012,-0.67196237,-5.338335017,-2.215692886,-3.035705681,6.0985858004,0.0954927426,1.7131028576,-0.71201405,1.7055144969,-1.582733813,-0.095994624,-4.376472851,-1.204180916,-1.349202525,7.4431558981,1.0026737968,2.8075852388,0.0474676034,2.4161455372 +050,2,4,27,047,Minnesota,Freeborn County,31255,31254,31203,31070,31026,30924,30742,30519,30441,30584,30552,30385,30364,-51,-133,-44,-102,-182,-223,-78,143,-32,-167,-21,94,360,328,365,346,323,339,336,325,299,309,107,362,359,313,359,421,340,375,383,349,360,-13,-2,-31,52,-13,-98,-1,-39,-58,-50,-51,3,14,17,11,20,44,36,37,34,30,24,-39,-145,-26,-169,-186,-167,-111,146,-6,-147,7,-36,-131,-9,-158,-166,-123,-75,183,28,-117,31,-2,0,-4,4,-3,-2,-2,-1,-2,0,-1,637,637,637,637,637,637,637,637,637,637,637,637,11.561993159,10.564287555,11.783696529,11.221742938,10.545044972,11.122047244,11.011880377,10.632033499,9.8134138537,10.173006963,11.626226454,11.562741561,10.104923325,11.643369118,13.744470381,11.154855643,12.290045063,12.529442554,11.45445296,11.852046947,-0.064233295,-0.998454007,1.6787732042,-0.42162618,-3.199425409,-0.032808399,-1.278164687,-1.897409055,-1.641039106,-1.679039984,0.4496330673,0.547539294,0.3551251009,0.6486556611,1.4364767144,1.1811023622,1.2126177796,1.1122742738,0.9846234636,0.7901364632,-4.656913911,-0.837413038,-5.456012914,-6.032497649,-5.452082075,-3.641732283,4.7849242114,-0.196283695,-4.824654972,0.2304564684,-4.207280844,-0.289873744,-5.100887813,-5.383841987,-4.015605361,-2.460629921,5.997541991,0.9159905784,-3.840031508,1.0205929316 +050,2,4,27,049,Minnesota,Goodhue County,46183,46194,46225,46122,46167,46135,46046,46092,46245,46341,46348,46391,46318,31,-103,45,-32,-89,46,153,96,7,43,-73,150,542,553,486,499,501,488,519,483,539,502,120,495,448,515,481,467,475,449,516,512,519,30,47,105,-29,18,34,13,70,-33,27,-17,7,13,9,20,32,29,10,10,13,6,2,-1,-162,-68,-20,-137,-11,133,20,30,10,-59,6,-149,-59,0,-105,18,143,30,43,16,-57,-5,-1,-1,-3,-2,-6,-3,-4,-3,0,1,901,901,895,898,892,877,899,892,888,868,857,857,11.738334759,11.984093446,10.53064939,10.826526074,10.87499186,10.569977366,11.211198237,10.421948667,11.624020099,10.829585046,10.720434881,9.7086326648,11.159021473,10.435990063,10.13696846,10.2884001,9.6990905752,11.134007272,11.041740799,11.196323981,1.0178998776,2.2754607808,-0.628372083,0.3905360107,0.7380233997,0.2815772659,1.5121076621,-0.712058605,0.5822793,-0.366738936,0.2815467747,0.1950394955,0.4333600572,0.6942862412,0.6294905468,0.2165978968,0.2160153803,0.2805079351,0.1293954,0.0431457572,-3.508505961,-1.473631744,-0.433360057,-2.97241297,-0.238772276,2.8807520279,0.4320307606,0.6473260042,0.215659,-1.272799836,-3.226959187,-1.278592248,0,-2.278126729,0.3907182704,3.0973499247,0.6480461409,0.9278339393,0.3450544,-1.229654079 +050,2,4,27,051,Minnesota,Grant County,6018,6018,6002,5991,5925,5953,5920,5865,5921,5916,5971,5977,6026,-16,-11,-66,28,-33,-55,56,-5,55,6,49,17,70,56,67,79,82,65,61,57,65,58,30,82,59,80,73,68,76,69,70,49,56,-13,-12,-3,-13,6,14,-11,-8,-13,16,2,0,1,0,0,0,0,2,2,3,2,2,-2,0,-63,40,-39,-70,67,2,65,-11,44,-2,1,-63,40,-39,-70,69,4,68,-9,46,-1,0,0,1,0,1,-2,-1,0,-1,1,110,110,110,110,110,110,110,110,110,110,110,110,11.673476194,9.3991272239,11.281360498,13.307504422,13.915994909,11.030035635,10.30666554,9.5903087406,10.880482089,9.664250604,13.674643542,9.9026518966,13.470281192,12.296807883,11.540093339,12.896657051,11.658359382,11.777572138,8.2022095748,9.3310005832,-2.001167348,-0.503524673,-2.188920694,1.0106965384,2.3759015698,-1.866621415,-1.351693841,-2.187263397,2.6782725142,0.3332500208,0.1667639456,0,0,0,0,0.3393857119,0.3379234603,0.5047530916,0.3347840643,0.3332500208,0,-10.57401813,6.7351405961,-6.569527499,-11.87950785,11.369421347,0.3379234603,10.936316985,-1.841312354,7.3315004582,0.1667639456,-10.57401813,6.7351405961,-6.569527499,-11.87950785,11.708807059,0.6758469207,11.441070077,-1.506528289,7.664750479 +050,2,4,27,053,Minnesota,Hennepin County,1152425,1152487,1154323,1169581,1184545,1198531,1211635,1222868,1236183,1248707,1258021,1265159,1268408,1836,15258,14964,13986,13104,11233,13315,12524,9314,7138,3249,4037,15917,16029,16499,16714,16755,16789,16594,15882,15712,15616,1839,7802,7739,8233,8068,8511,8588,8596,8852,9024,9617,2198,8115,8290,8266,8646,8244,8201,7998,7030,6688,5999,1221,5074,4679,4631,6400,6550,6455,4382,3857,3626,2749,-1548,2078,2095,1184,-1706,-3411,-1294,178,-1537,-3180,-5547,-327,7152,6774,5815,4694,3139,5161,4560,2320,446,-2798,-35,-9,-100,-95,-236,-150,-47,-34,-36,4,48,25084,25077,25186,25226,25339,25892,25580,25720,25640,25045,25100,25354,13.698500454,13.61779276,13.846809753,13.869584087,13.764616433,13.654861164,13.3559232,12.671498463,12.45412535,12.327284023,6.7145630801,6.5748392397,6.9095572277,6.694974537,6.9919815256,6.9848083671,6.9186161158,7.0625931493,7.1528785105,7.5916681896,6.9839373743,7.0429535208,6.9372525257,7.1746095497,6.7726349074,6.6700527968,6.437307084,5.608905314,5.3012468393,4.7356158333,4.3667896781,3.9751483141,3.8865734874,5.3108375108,5.3809750902,5.2499927818,3.5269166844,3.0773183209,2.8741508731,2.1700629981,1.7883699155,1.7798537546,0.9936737225,-1.415670124,-2.802214661,-1.052438522,0.1432658991,-1.226299782,-2.52062873,-4.378806639,6.1551595935,5.7550020687,4.8802472099,3.8951673868,2.5787604287,4.1975542598,3.6701825835,1.8510185389,0.3535221427,-2.208743641 +050,2,4,27,055,Minnesota,Houston County,19027,19020,19027,18877,18766,18780,18707,18695,18740,18705,18608,18667,18632,7,-150,-111,14,-73,-12,45,-35,-97,59,-35,38,164,200,182,195,206,204,199,215,179,182,26,172,175,146,174,211,178,159,206,158,172,12,-8,25,36,21,-5,26,40,9,21,10,2,2,1,6,7,12,17,9,8,9,5,-5,-146,-138,-29,-100,-18,2,-83,-113,30,-50,-3,-144,-137,-23,-93,-6,19,-74,-105,39,-45,-2,2,1,1,-1,-1,0,-1,-1,-1,0,257,257,257,257,257,257,257,257,257,257,257,257,8.6534402702,10.626145631,9.6947744101,10.403606584,11.015453719,10.898891412,10.62892242,11.52413368,9.6042924212,9.7589747714,9.0755593077,9.2978774274,7.7771267246,9.2832181823,11.282819101,9.5098170162,8.4924556015,11.041728084,8.4775318578,9.2227673664,-0.422119038,1.3282682039,1.9176476855,1.1203884013,-0.267365382,1.3890743956,2.136466818,0.4824055959,1.1267605634,0.536207405,0.1055297594,0.0531307282,0.3196079476,0.3734628004,0.6416769157,0.908240951,0.480705034,0.4288049741,0.4828973843,0.2681037025,-7.703672436,-7.332040486,-1.544771747,-5.335182863,-0.962515374,0.1068518766,-4.433168647,-6.05687026,1.6096579477,-2.681037025,-7.598142676,-7.278909757,-1.225163799,-4.961720063,-0.320838458,1.0150928276,-3.952463613,-5.628065286,2.092555332,-2.412933323 +050,2,4,27,057,Minnesota,Hubbard County,20428,20428,20427,20516,20453,20694,20631,20645,20709,20989,21350,21604,21783,-1,89,-63,241,-63,14,64,280,361,254,179,59,231,208,209,233,210,209,214,198,220,202,58,178,193,188,222,215,198,221,214,215,205,1,53,15,21,11,-5,11,-7,-16,5,-3,1,11,8,10,12,11,22,15,13,15,10,0,26,-81,208,-85,10,32,270,364,235,175,1,37,-73,218,-73,21,54,285,377,250,185,-3,-1,-5,2,-1,-2,-1,2,0,-1,-3,154,154,154,154,154,154,154,154,154,154,154,154,11.283980168,10.154018892,10.158699298,11.27646703,10.175404593,10.107849301,10.26428126,9.3530787217,10.24351632,9.3115449328,8.6950150209,9.4217579145,9.1379687462,10.744101633,10.417676131,9.5758572327,10.600028778,10.108883063,10.010709131,9.4498352041,2.5889651467,0.7322609778,1.0207305514,0.5323653962,-0.242271538,0.5319920685,-0.335747518,-0.755804341,0.2328071891,-0.138290271,0.5373323889,0.3905391882,0.4860621674,0.5807622505,0.5329973835,1.063984137,0.7194589669,0.6140910272,0.6984215673,0.4609675709,1.2700583738,-3.95420928,10.110093081,-4.113732607,0.4845430759,1.5476132901,12.950261403,17.194548761,10.941937887,8.0669324913,1.8073907628,-3.563670092,10.596155248,-3.532970357,1.0175404593,2.6115974271,13.66972037,17.808639788,11.640359454,8.5279000622 +050,2,4,27,059,Minnesota,Isanti County,37816,37811,37856,38200,38150,38066,38273,38281,38763,39537,39846,40447,41429,45,344,-50,-84,207,8,482,774,309,601,982,124,500,447,446,424,454,439,438,444,477,466,82,266,308,284,323,307,300,339,316,354,357,42,234,139,162,101,147,139,99,128,123,109,2,16,22,19,30,22,21,10,8,7,8,6,93,-213,-267,84,-162,323,663,175,472,868,8,109,-191,-248,114,-140,344,673,183,479,876,-5,1,2,2,-8,1,-1,2,-2,-1,-3,465,465,465,465,465,465,465,465,465,465,465,465,13.148206585,11.709233792,11.703579301,11.108345669,11.86090864,11.396085354,11.187739464,11.186274139,11.881484065,11.383067077,6.994845903,8.0681074001,7.4525034114,8.4622538938,8.020482274,7.787757645,8.6590038314,7.9614023154,8.8177051549,8.720504177,6.1533606816,3.6411263916,4.2510758896,2.6460917748,3.8404263657,3.6083277088,2.5287356322,3.2248718239,3.0637789097,2.6625629,0.4207426107,0.5762933857,0.4985829747,0.7859678539,0.5747576874,0.5451430351,0.2554278416,0.201554489,0.1743614014,0.1954174606,2.4455664247,-5.57956778,-7.006402855,2.200709991,-4.232306607,8.3848190644,16.9348659,4.4090044468,11.756940206,21.20279447,2.8663090354,-5.003274394,-6.50781988,2.9866778449,-3.65754892,8.9299620996,17.190293742,4.6105589358,11.931301608,21.39821193 +050,2,4,27,061,Minnesota,Itasca County,45058,45055,45034,45103,45150,45334,45327,45269,45171,45096,45139,45225,45268,-21,69,47,184,-7,-58,-98,-75,43,86,43,101,473,467,457,445,509,471,442,475,431,433,91,511,489,557,508,586,531,528,485,538,520,10,-38,-22,-100,-63,-77,-60,-86,-10,-107,-87,3,7,3,1,6,13,16,11,10,11,6,-29,103,76,282,63,11,-51,4,47,182,126,-26,110,79,283,69,24,-35,15,57,193,132,-5,-3,-10,1,-13,-5,-3,-4,-4,0,-2,1021,1021,1021,1012,1023,1023,1018,1020,1021,1017,1004,1005,10.495135183,10.34868647,10.101233367,9.81679002,11.236699192,10.415745245,9.7931691537,10.528065606,9.5391970254,9.5698009791,11.338296149,10.836204891,12.311568896,11.206582764,12.93655349,11.742591774,11.698627405,10.749709093,11.907396751,11.492601638,-0.843160966,-0.48751842,-2.210335529,-1.389792744,-1.699854298,-1.326846528,-1.905458252,-0.221643486,-2.368199726,-1.922800659,0.1553191253,0.0664797846,0.0221033553,0.1323612138,0.286988388,0.3538257408,0.2437214043,0.2216434865,0.2434597849,0.132606942,2.285409987,1.6841545433,6.2331461916,1.3897927444,0.2428363283,-1.127819549,0.0886259652,1.0417243863,4.0281528042,2.7847457814,2.4407291124,1.7506343279,6.2552495469,1.5221539582,0.5298247163,-0.773993808,0.3323473695,1.2633678728,4.2716125891,2.9173527234 +050,2,4,27,063,Minnesota,Jackson County,10266,10266,10272,10198,10311,10284,10274,10098,9962,9968,9866,9799,9768,6,-74,113,-27,-10,-176,-136,6,-102,-67,-31,23,98,104,131,109,122,104,108,111,94,96,20,131,101,95,113,110,99,113,90,105,110,3,-33,3,36,-4,12,5,-5,21,-11,-14,0,0,-1,0,2,13,10,8,6,6,6,3,-40,112,-66,-6,-203,-151,4,-129,-63,-21,3,-40,111,-66,-4,-190,-141,12,-123,-57,-15,0,-1,-1,3,-2,2,0,-1,0,1,-2,110,110,110,110,110,110,110,110,110,110,110,110,9.574987787,10.141888927,12.721534353,10.604144372,11.97722364,10.36889332,10.837932765,11.192901079,9.5601322146,9.8124393111,12.799218368,9.8493344385,9.2255401797,10.993287285,10.799136069,9.8703888335,11.339688911,9.0753251992,10.678871091,11.243420044,-3.224230581,0.2925544883,3.4959941733,-0.389142913,1.1780875712,0.4985044865,-0.501756147,2.1175758798,-1.118738876,-1.430980733,0,-0.097518163,0,0.1945714564,1.2762615354,0.9970089731,0.8028098344,0.6050216799,0.6102212052,0.6132774569,-3.90815828,10.922034229,-6.409322651,-0.583714369,-19.92931475,-15.05483549,0.4014049172,-13.00796612,-6.407322654,-2.146471099,-3.90815828,10.824516066,-6.409322651,-0.389142913,-18.65305321,-14.05782652,1.2042147516,-12.40294444,-5.797101449,-1.533193642 +050,2,4,27,065,Minnesota,Kanabec County,16239,16244,16217,16227,15977,16015,15978,15895,15896,16069,16288,16357,16416,-27,10,-250,38,-37,-83,1,173,219,69,59,38,158,114,166,151,177,134,187,186,160,169,51,146,132,142,144,159,165,158,129,148,190,-13,12,-18,24,7,18,-31,29,57,12,-21,1,5,2,2,14,14,16,5,4,4,4,-14,-5,-239,12,-57,-113,16,139,159,53,76,-13,0,-237,14,-43,-99,32,144,163,57,80,-1,-2,5,0,-1,-2,0,0,-1,0,0,246,246,246,246,246,246,246,246,246,246,246,246,9.7398594501,7.0798658552,10.377594399,9.4395649048,11.106579236,8.4300588217,11.7002972,11.4967395,9.8024199724,10.313367711,9.0001232894,8.1977394113,8.8772193048,9.0019691808,9.9770966021,10.38029631,9.8858126075,7.9735451371,9.0672384745,11.594910445,0.7397361608,-1.117873556,1.5003750938,0.4375957241,1.1294826342,-1.950237489,1.8144845925,3.5231943629,0.7351814979,-1.281542733,0.3082234003,0.1242081729,0.1250312578,0.8751914481,0.8784864933,1.0065741877,0.3128421711,0.2472417097,0.2450604993,0.2441033778,-0.3082234,-14.84287666,0.7501875469,-3.563279467,-7.090640981,1.0065741877,8.6970123573,9.8278579596,3.2470516159,4.6379641778,0,-14.71866849,0.8752188047,-2.688088019,-6.212154488,2.0131483753,9.0098545284,10.075099669,3.4921121152,4.8820675556 +050,2,4,27,067,Minnesota,Kandiyohi County,42239,42237,42231,42205,42380,42463,42502,42638,42672,42747,42850,43137,43130,-6,-26,175,83,39,136,34,75,103,287,-7,135,576,541,593,578,595,603,598,577,560,556,116,386,373,395,359,424,387,374,390,398,387,19,190,168,198,219,171,216,224,187,162,169,20,96,104,134,230,264,233,195,185,187,144,-42,-313,-93,-249,-416,-298,-414,-343,-270,-61,-320,-22,-217,11,-115,-186,-34,-181,-148,-85,126,-176,-3,1,-4,0,6,-1,-1,-1,1,-1,0,1058,1058,1058,1058,1064,1065,1046,1046,1047,1047,1047,1047,13.64346961,12.79186617,13.97876077,13.605602307,13.976979093,14.136677998,14.001568738,13.481780904,13.025224743,12.890212944,9.1430195651,8.8195306496,9.3113161958,8.450538457,9.960065774,9.0727933419,8.7568339597,9.1124688949,9.2572132997,8.9721446208,4.500450045,3.9723355205,4.6674445741,5.1550638498,4.0169133192,5.063884656,5.244734778,4.3693120086,3.7680114436,3.9180683228,2.2739116017,2.459064846,3.1587756209,5.4139939975,6.2015503876,5.4624311335,4.5657289362,4.3225813989,4.3494946911,3.338472417,-7.413899285,-2.198971449,-5.869665146,-9.792267404,-7.000234907,-9.705778924,-8.031000129,-6.308632312,-1.418819124,-7.418827593,-5.139987683,0.2600933972,-2.710889525,-4.378273407,-0.79868452,-4.24334779,-3.465271193,-1.986050913,2.9306755672,-4.080355176 +050,2,4,27,069,Minnesota,Kittson County,4552,4552,4553,4540,4497,4498,4455,4410,4323,4261,4276,4286,4214,1,-13,-43,1,-43,-45,-87,-62,15,10,-72,9,53,48,43,62,46,39,39,65,44,47,7,53,77,64,80,75,65,57,63,57,58,2,0,-29,-21,-18,-29,-26,-18,2,-13,-11,0,0,0,0,2,4,4,3,2,3,1,0,-12,-13,23,-28,-21,-63,-47,11,20,-61,0,-12,-13,23,-26,-17,-59,-44,13,23,-60,-1,-1,-1,-1,1,1,-2,0,0,0,-1,111,111,111,111,111,111,111,111,111,111,111,111,11.657318817,10.622994357,9.5608671484,13.85010611,10.377890581,8.9316386122,9.0866728798,15.227831791,10.277972436,11.058823529,11.657318817,17.041053447,14.230127849,17.871104658,16.920473773,14.886064354,13.280521901,14.759283121,13.314646111,13.647058824,0,-6.41805909,-4.6692607,-4.020998548,-6.542583192,-5.954425741,-4.193849021,0.4685486705,-3.036673674,-2.588235294,0,0,0,0.4467776164,0.9024252679,0.9160654987,0.6989748369,0.4685486705,0.7007708479,0.2352941176,-2.63939294,-2.877060972,5.1139521957,-6.25488663,-4.737732657,-14.4280316,-10.95060578,2.5770176877,4.6718056529,-14.35294118,-2.63939294,-2.877060972,5.1139521957,-5.808109014,-3.835307389,-13.51196611,-10.25163094,3.0455663582,5.3725765008,-14.11764706 +050,2,4,27,071,Minnesota,Koochiching County,13311,13319,13320,13238,13166,13091,12849,12798,12607,12505,12404,12202,12059,1,-82,-72,-75,-242,-51,-191,-102,-101,-202,-143,29,124,104,104,106,102,98,96,112,90,95,46,163,151,152,156,126,157,156,141,148,161,-17,-39,-47,-48,-50,-24,-59,-60,-29,-58,-66,1,4,5,5,6,7,7,4,4,2,2,18,-48,-30,-30,-200,-32,-140,-46,-74,-146,-78,19,-44,-25,-25,-194,-25,-133,-42,-70,-144,-76,-1,1,0,-2,2,-2,1,0,-2,0,-1,241,241,241,241,241,241,241,241,241,241,241,241,9.3380525642,7.8775943039,7.9216970713,8.1727062452,7.9541466838,7.715016729,7.6457470532,8.9927335501,7.3152889539,7.8314991138,12.275020709,11.43766096,11.57786495,12.027756361,9.8257106094,12.359771698,12.424338961,11.321209201,12.02958628,13.272330077,-2.936968145,-3.560066657,-3.656167879,-3.855050116,-1.871563926,-4.644754969,-4.778591908,-2.328475651,-4.714297326,-5.440830963,0.3012275021,0.3787304954,0.3808508207,0.4626060139,0.5458728116,0.5510726235,0.3185727939,0.3211690554,0.1625619768,0.1648736656,-3.614730025,-2.272382972,-2.285104924,-15.42020046,-2.495418567,-11.02145247,-3.66358713,-5.941627524,-11.8670243,-6.430072957,-3.313502523,-1.893652477,-1.904254104,-14.95759445,-1.949545756,-10.47037985,-3.345014336,-5.620458469,-11.70446233,-6.265199291 +050,2,4,27,073,Minnesota,Lac qui Parle County,7259,7258,7245,7221,7123,7006,6901,6876,6743,6682,6644,6628,6527,-13,-24,-98,-117,-105,-25,-133,-61,-38,-16,-101,23,73,66,62,67,60,62,54,66,69,65,17,100,105,86,90,72,87,92,85,76,93,6,-27,-39,-24,-23,-12,-25,-38,-19,-7,-28,0,2,2,5,4,8,8,7,5,5,4,-19,0,-63,-100,-87,-21,-116,-30,-26,-12,-78,-19,2,-61,-95,-83,-13,-108,-23,-21,-7,-74,0,1,2,2,1,0,0,0,2,-2,1,154,154,154,154,154,154,154,154,154,154,154,154,10.092630997,9.2024539877,8.7762757449,9.6354353922,8.7101691225,9.1049269403,8.0446927374,9.9054479964,10.397830018,9.8821740783,13.825521913,14.640267708,12.173543775,12.943122169,10.452202947,12.776268448,13.705772812,12.757016359,11.452682339,14.139110604,-3.732890917,-5.43781372,-3.39726803,-3.307686776,-1.742033824,-3.671341508,-5.661080074,-2.851568363,-1.054852321,-4.256936526,0.2765104383,0.2788622421,0.707764173,0.5752498742,1.161355883,1.1748292826,1.04283054,0.750412727,0.7534659433,0.6081337894,0,-8.784160625,-14.15528346,-12.51168476,-3.048559193,-17.0350246,-4.469273743,-3.90214618,-1.808318264,-11.85860889,0.2765104383,-8.505298383,-13.44751929,-11.93643489,-1.88720331,-15.86019532,-3.426443203,-3.151733453,-1.054852321,-11.2504751 +050,2,4,27,075,Minnesota,Lake County,10866,10862,10854,10779,10792,10706,10602,10540,10501,10481,10609,10625,10639,-8,-75,13,-86,-104,-62,-39,-20,128,16,14,36,113,117,112,100,103,98,103,105,95,95,51,141,120,155,140,141,137,150,137,143,126,-15,-28,-3,-43,-40,-38,-39,-47,-32,-48,-31,1,0,6,7,15,7,4,2,2,1,1,8,-47,12,-47,-81,-29,-3,25,157,65,43,9,-47,18,-40,-66,-22,1,27,159,66,44,-2,0,-2,-3,2,-2,-1,0,1,-2,1,224,224,224,224,224,224,224,224,224,224,224,224,10.447002265,10.84789764,10.419573914,9.3861460484,9.7436382556,9.3151466185,9.817939186,9.9573257468,8.9479137233,8.9352896915,13.035639994,11.126048862,14.419946041,13.140604468,13.338378583,13.022194763,14.297969688,12.991939308,13.468964868,11.851015801,-2.588637729,-0.278151222,-4.000372128,-3.754458419,-3.594740327,-3.707048144,-4.480030502,-3.034613561,-4.521051144,-2.91572611,0,0.5563024431,0.6512233696,1.4079219073,0.6621890077,0.3802100661,0.1906395958,0.1896633476,0.0941885655,0.094055681,-4.345213331,1.1126048862,-4.372499767,-7.602778299,-2.74335446,-0.28515755,2.3829949481,14.888572783,6.122256758,4.0443942814,-4.345213331,1.6689073293,-3.721276398,-6.194856392,-2.081165453,0.0950525165,2.5736345439,15.078236131,6.2164453235,4.1384499624 +050,2,4,27,077,Minnesota,Lake of the Woods County,4045,4045,4035,4011,3947,3911,3891,3870,3791,3730,3722,3736,3754,-10,-24,-64,-36,-20,-21,-79,-61,-8,14,18,3,31,35,35,36,28,45,40,30,36,37,17,46,56,44,42,46,45,44,48,26,36,-14,-15,-21,-9,-6,-18,0,-4,-18,10,1,0,5,4,4,4,0,0,0,0,0,0,2,-12,-47,-32,-18,-2,-80,-55,9,4,18,2,-7,-43,-28,-14,-2,-80,-55,9,4,18,2,-2,0,1,0,-1,1,-2,1,0,-1,53,53,53,53,53,53,53,53,53,53,53,53,7.7056922695,8.7961799447,8.9081191143,9.2284029736,7.2155650045,11.747813601,10.636883393,8.0515297907,9.6540627514,9.8798397864,11.434253045,14.073887912,11.198778315,10.766470136,11.854142507,11.747813601,11.700571732,12.882447665,6.9723786538,9.6128170895,-3.728560776,-5.277707967,-2.290659201,-1.538067162,-4.638577503,0,-1.063688339,-4.830917874,2.6816840976,0.2670226969,1.2428535918,1.005277708,1.0180707559,1.0253781082,0,0,0,0,0,0,-2.98284862,-11.81201307,-8.144566047,-4.614201487,-0.5153975,-20.88500196,-14.62571467,2.4154589372,1.072673639,4.8064085447,-1.739995029,-10.80673536,-7.126495291,-3.588823379,-0.5153975,-20.88500196,-14.62571467,2.4154589372,1.072673639,4.8064085447 +050,2,4,27,079,Minnesota,Le Sueur County,27703,27701,27732,27786,27666,27710,27819,27762,27752,28193,28583,28856,28741,31,54,-120,44,109,-57,-10,441,390,273,-115,103,321,314,299,295,318,302,350,327,318,317,30,193,198,236,211,238,242,227,199,268,265,73,128,116,63,84,80,60,123,128,50,52,0,10,6,4,12,33,25,20,18,18,15,-40,-85,-250,-18,17,-170,-94,300,244,206,-183,-40,-75,-244,-14,29,-137,-69,320,262,224,-168,-2,1,8,-5,-4,0,-1,-2,0,-1,1,270,270,270,270,270,270,270,270,270,270,270,270,11.56381714,11.325110005,10.798902051,10.625078788,11.442759216,10.880138343,12.512288855,11.51895167,11.072616167,11.007517753,6.9527000252,7.1413114045,8.5235481075,7.5996326244,8.5640776524,8.718521454,8.1151130575,7.0100042271,9.331638782,9.2018681529,4.6111171152,4.1837986006,2.2753539439,3.0254461633,2.8786815638,2.1616168894,4.3971757977,4.5089474426,1.7409773847,1.8056495998,0.3602435246,0.2164033759,0.1444669171,0.4322065948,1.1874561451,0.9006737039,0.7149879346,0.6340707341,0.6267518585,0.5208604615,-3.062069959,-9.016807329,-0.650101127,0.6122926759,-6.117198323,-3.386533127,10.724819019,8.5951810624,7.172826825,-6.35449763,-2.701826435,-8.800403953,-0.50563421,1.0444992707,-4.929742178,-2.485859423,11.439806953,9.2292517965,7.7995786835,-5.833637169 +050,2,4,27,081,Minnesota,Lincoln County,5896,5895,5885,5808,5755,5755,5764,5707,5702,5662,5654,5619,5568,-10,-77,-53,0,9,-57,-5,-40,-8,-35,-51,20,56,67,76,68,71,76,59,80,66,70,32,90,71,67,77,95,71,80,77,74,82,-12,-34,-4,9,-9,-24,5,-21,3,-8,-12,0,0,0,0,0,0,0,0,0,0,0,2,-42,-47,-10,19,-33,-8,-19,-10,-27,-39,2,-42,-47,-10,19,-33,-8,-19,-10,-27,-39,0,-1,-2,1,-1,0,-2,0,-1,0,0,135,135,135,135,135,135,135,135,135,135,135,135,9.5783802275,11.588688057,13.205907906,11.806580432,12.379042804,13.322815321,10.383667723,14.139271828,11.709394128,12.514525789,15.393825366,12.28055003,11.642050391,13.369216078,16.563507977,12.446314313,14.079549454,13.609049134,13.128714628,14.659873067,-5.815445138,-0.691861974,1.5638575152,-1.562635645,-4.184465173,0.876501008,-3.695881732,0.5302226935,-1.4193205,-2.145347278,0,0,0,0,0,0,0,0,0,0,-7.183785171,-8.129378189,-1.737619461,3.2988974737,-5.753639613,-1.402401613,-3.343892995,-1.767408978,-4.790206689,-6.972378654,-7.183785171,-8.129378189,-1.737619461,3.2988974737,-5.753639613,-1.402401613,-3.343892995,-1.767408978,-4.790206689,-6.972378654 +050,2,4,27,083,Minnesota,Lyon County,25857,25858,25852,25834,25639,25727,25779,25830,25996,25974,25656,25579,25271,-6,-18,-195,88,52,51,166,-22,-318,-77,-308,92,379,343,360,365,376,376,374,362,343,340,67,206,209,212,220,238,221,221,229,197,236,25,173,134,148,145,138,155,153,133,146,104,10,58,55,64,106,133,167,119,110,106,83,-43,-249,-398,-124,-205,-223,-157,-295,-566,-328,-492,-33,-191,-343,-60,-99,-90,10,-176,-456,-222,-409,2,0,14,0,6,3,1,1,5,-1,-3,1092,1092,1029,920,1083,1055,1093,1050,1032,900,867,867,14.665480014,13.327375517,14.017054082,14.173106046,14.57110194,14.51009146,14.392918992,14.022854929,13.389284669,13.3726647,7.9712107727,8.1207623414,8.2544874041,8.5426940551,9.2231975043,8.5285377996,8.5049066769,8.8708115437,7.690055626,9.2822025565,6.6942692412,5.2066131758,5.7625666783,5.6304119908,5.3479044353,5.9815536603,5.8880123148,5.1520433856,5.6992290426,4.0904621436,2.2443214797,2.1370427214,2.4919207258,4.1160253174,5.1541397818,6.4446416856,4.5795651337,4.2610885144,4.1377964282,3.2645034415,-9.635104284,-15.46441824,-4.828096406,-7.960237642,-8.641903544,-6.058734998,-11.35270348,-21.92523727,-12.80374744,-19.35103245,-7.390782804,-13.32737552,-2.33617568,-3.844212325,-3.487763762,0.3859066878,-6.773138349,-17.66414875,-8.66595101,-16.08652901 +050,2,4,27,085,Minnesota,McLeod County,36651,36645,36592,36345,35933,35896,35772,35808,35746,35860,35798,35826,35710,-53,-247,-412,-37,-124,36,-62,114,-62,28,-116,114,432,393,460,393,424,426,415,352,396,390,105,295,323,340,332,308,370,345,335,345,376,9,137,70,120,61,116,56,70,17,51,14,1,15,11,31,26,22,6,0,0,-1,0,-65,-401,-508,-190,-210,-98,-124,46,-78,-20,-131,-64,-386,-497,-159,-184,-76,-118,46,-78,-21,-131,2,2,15,2,-1,-4,0,-2,-1,-2,1,476,476,476,476,476,476,476,476,476,476,476,476,11.84583956,10.874678325,12.808197246,10.967237819,11.846884605,11.907091148,11.591207441,9.8244438862,11.057746007,10.903600984,8.0891728478,8.9377127203,9.4669283994,9.264943908,8.6057557977,10.341839729,9.636064017,9.3499679031,9.6336423545,10.512189667,3.7566667124,1.936965605,3.3412688468,1.7022939108,3.2411288069,1.5652514185,1.9551434237,0.4744759831,1.4241036524,0.3914113174,0.4113138736,0.3043803094,0.8631611188,0.7255678964,0.6146968427,0.1677055091,0,0,-0.027923601,0,-10.99579089,-14.05683611,-5.290342341,-5.860356086,-2.738195027,-3.465913855,1.2848085356,-2.177007452,-0.558472021,-3.662491613,-10.58447701,-13.7524558,-4.427181222,-5.13478819,-2.123498184,-3.298208346,1.2848085356,-2.177007452,-0.586395622,-3.662491613 +050,2,4,27,087,Minnesota,Mahnomen County,5413,5413,5440,5473,5503,5468,5496,5428,5472,5563,5492,5540,5473,27,33,30,-35,28,-68,44,91,-71,48,-67,28,121,99,101,95,106,96,108,91,99,95,5,68,53,73,66,63,63,69,76,52,53,23,53,46,28,29,43,33,39,15,47,42,0,0,0,0,1,1,1,1,1,1,0,4,-20,-14,-63,-1,-114,11,50,-87,1,-107,4,-20,-14,-63,0,-113,12,51,-86,2,-107,0,0,-2,0,-1,2,-1,1,0,-1,-2,79,79,79,79,79,79,79,79,79,79,79,79,22.175387153,18.039358601,18.412177559,17.32944181,19.406810692,17.614678899,19.574082465,16.463138851,17.947788252,17.252338146,12.462201045,9.6574344023,13.307811503,12.039401678,11.534236543,11.559633028,12.505663797,13.749434645,9.4271211022,9.6249886498,9.7131861083,8.3819241983,5.104366056,5.2900401313,7.8725741487,6.0550458716,7.0684186679,2.7137042062,8.5206671501,7.6273494961,0,0,0,0.1824151769,0.1830831197,0.1834862385,0.1812415043,0.1809136137,0.1812907904,0,-3.665353248,-2.551020408,-11.48482363,-0.182415177,-20.87147565,2.0183486239,9.0620752152,-15.7394844,0.1812907904,-19.43158086,-3.665353248,-2.551020408,-11.48482363,0,-20.68839253,2.2018348624,9.2433167195,-15.55857078,0.3625815809,-19.43158086 +050,2,4,27,089,Minnesota,Marshall County,9439,9437,9440,9458,9471,9429,9419,9410,9369,9359,9373,9345,9321,3,18,13,-42,-10,-9,-41,-10,14,-28,-24,34,94,112,105,111,116,113,115,111,108,102,13,84,72,81,72,87,73,81,85,63,85,21,10,40,24,39,29,40,34,26,45,17,0,1,1,0,1,3,2,2,2,1,2,-19,8,-29,-63,-51,-41,-81,-46,-15,-74,-41,-19,9,-28,-63,-50,-38,-79,-44,-13,-73,-39,1,-1,1,-3,1,0,-2,0,1,0,-2,76,76,76,76,76,76,76,76,76,76,76,76,9.9481426606,11.833694331,11.111111111,11.778438031,12.321419088,12.034719634,12.281076463,11.851377322,11.539694412,10.928961749,8.8898296116,7.6073749274,8.5714285714,7.6400679117,9.2410643157,7.7746418872,8.6501495088,9.0753790305,6.7314884069,9.1074681239,1.058313049,4.2263194041,2.5396825397,4.1383701188,3.0803547719,4.2600777464,3.6309269543,2.7759982917,4.8082060049,1.8214936248,0.1058313049,0.1056579851,0,0.1061120543,0.3186573902,0.2130038873,0.2135839385,0.2135383301,0.1068490223,0.2142933676,0.8466504392,-3.064081568,-6.666666667,-5.411714771,-4.354984333,-8.626657436,-4.912430585,-1.601537476,-7.906827653,-4.393014036,0.9524817441,-2.958423583,-6.666666667,-5.305602716,-4.036326942,-8.413653549,-4.698846647,-1.387999146,-7.79997863,-4.178720669 +050,2,4,27,091,Minnesota,Martin County,20840,20843,20805,20627,20461,20424,20247,20041,19920,19867,19772,19641,19484,-38,-178,-166,-37,-177,-206,-121,-53,-95,-131,-157,47,220,216,222,222,217,240,236,233,243,247,81,250,238,218,275,279,254,244,241,244,235,-34,-30,-22,4,-53,-62,-14,-8,-8,-1,12,0,-1,0,-2,4,6,7,-1,-1,-1,1,-2,-148,-146,-36,-128,-151,-113,-44,-86,-129,-169,-2,-149,-146,-38,-124,-145,-106,-45,-87,-130,-168,-2,1,2,-3,0,1,-1,0,0,0,-1,348,348,348,348,348,348,348,348,348,348,348,348,10.619810774,10.514018692,10.859728507,10.916869514,10.772438443,12.011711419,11.863171388,11.756098792,12.330956791,12.626198083,12.067966789,11.584890966,10.664057723,13.523149173,13.850277998,12.712394585,12.265312791,12.159741669,12.381701469,12.012779553,-1.448156015,-1.070872274,0.1956707839,-2.606279659,-3.077839555,-0.700683166,-0.402141403,-0.403642877,-0.050744678,0.6134185304,-0.048271867,0,-0.097835392,0.1967003516,0.2978554408,0.350341583,-0.050267675,-0.05045536,-0.050744678,0.0511182109,-7.144236339,-7.106697819,-1.761037055,-6.294411251,-7.496028594,-5.655514126,-2.211777716,-4.339160927,-6.546063482,-8.638977636,-7.192508206,-7.106697819,-1.858872447,-6.0977109,-7.198173153,-5.305172543,-2.262045392,-4.389616287,-6.59680816,-8.587859425 +050,2,4,27,093,Minnesota,Meeker County,23300,23302,23333,23198,23041,23091,23129,23048,23081,23037,23122,23166,23341,31,-135,-157,50,38,-81,33,-44,85,44,175,78,279,286,257,285,270,297,258,264,278,280,32,207,215,231,225,244,211,243,245,217,233,46,72,71,26,60,26,86,15,19,61,47,1,10,15,19,24,24,12,8,8,8,4,-15,-219,-245,7,-44,-133,-62,-67,61,-24,124,-14,-209,-230,26,-20,-109,-50,-59,69,-16,128,-1,2,2,-2,-2,2,-3,0,-3,-1,0,354,354,354,354,354,354,354,354,354,354,354,354,11.99200533,12.370509743,11.141940519,12.332323669,11.694133443,12.876932082,11.188689882,11.438722676,12.011752506,12.041198099,8.8972942769,9.2995090724,10.01474031,9.7360450022,10.568031704,9.1482581456,10.538184657,10.615481271,9.3760801936,10.01999699,3.0947110528,3.0710006704,1.1272002081,2.5962786672,1.126101739,3.7286739361,0.6505052257,0.8232414047,2.6356723125,2.0212011095,0.4298209796,0.6488029585,0.823723229,1.0385114669,1.0394785283,0.5202800841,0.3469361204,0.3466279599,0.3456619426,0.1720171157,-9.413079452,-10.59711499,0.3034769791,-1.903937689,-5.760443511,-2.688113768,-2.905590008,2.6430381941,-1.036985828,5.3325305868,-8.983258473,-9.948312031,1.1272002081,-0.865426222,-4.720964983,-2.167833684,-2.558653888,2.9896661539,-0.691323885,5.5045477025 +050,2,4,27,095,Minnesota,Mille Lacs County,26097,26094,26073,25842,25629,25651,25553,25482,25595,25845,26062,26166,26146,-21,-231,-213,22,-98,-71,113,250,217,104,-20,93,295,338,343,310,309,336,331,301,308,294,87,279,279,294,284,301,312,311,269,308,302,6,16,59,49,26,8,24,20,32,0,-8,1,12,3,5,9,10,9,5,4,5,4,-26,-260,-283,-29,-130,-86,82,226,181,98,-15,-25,-248,-280,-24,-121,-76,91,231,185,103,-11,-2,1,8,-3,-3,-3,-2,-1,0,1,-1,523,523,523,523,523,523,523,523,523,523,523,523,11.36473081,13.133609217,13.377535101,12.108429029,12.10933673,13.156606692,12.869362364,11.597665055,11.794439764,11.240250803,10.74833863,10.841056129,11.466458658,11.092883368,11.795826394,12.216849071,12.091757387,10.364690697,11.794439764,11.546107968,0.6163921795,2.2925530881,1.9110764431,1.0155456605,0.313510336,0.9397576208,0.7776049767,1.232974358,0,-0.305857165,0.4622941346,0.116570496,0.1950078003,0.3515350363,0.3918879201,0.3524091078,0.1944012442,0.1541217947,0.191468178,0.1529285824,-10.01637292,-10.99648346,-1.131045242,-5.077728302,-3.370236112,3.2108385379,8.7869362364,6.9740112124,3.7527762886,-0.573482184,-9.554078783,-10.87991296,-0.936037441,-4.726193266,-2.978348192,3.5632476457,8.9813374806,7.1281330071,3.9442444666,-0.420553601 +050,2,4,27,097,Minnesota,Morrison County,33198,33198,33244,33259,33101,32862,32811,32770,32907,33075,33098,33329,33187,46,15,-158,-239,-51,-41,137,168,23,231,-142,105,387,369,366,391,385,405,379,362,364,363,44,286,320,361,306,329,330,292,317,347,382,61,101,49,5,85,56,75,87,45,17,-19,4,17,6,7,8,8,3,2,2,2,1,-16,-102,-212,-256,-141,-105,62,83,-23,214,-122,-12,-85,-206,-249,-133,-97,65,85,-21,216,-121,-3,-1,-1,5,-3,0,-3,-4,-1,-2,-2,528,528,528,528,527,527,527,527,528,529,527,521,11.638572696,11.121157324,11.097130209,11.907481004,11.741205532,12.333084642,11.487981571,10.94101824,10.95939904,10.914667148,8.6011157391,9.6443640747,10.94553007,9.3188981773,10.033393818,10.049180078,8.85089873,9.5809469119,10.447558975,11.485958266,3.0374569568,1.4767932489,0.1516001395,2.588582827,1.7078117138,2.2839045632,2.6370828408,1.3600713282,0.511840065,-0.571291118,0.5112551313,0.1808318264,0.2122401953,0.2436313249,0.243973102,0.0913561825,0.060622594,0.0604476146,0.0602164782,0.0300679536,-3.067530788,-6.3893912,-7.761927141,-4.294002101,-3.202146963,1.8880277723,2.5158376527,-0.695147568,6.4431631716,-3.668290336,-2.556275657,-6.208559373,-7.549686946,-4.050370776,-2.958173861,1.9793839548,2.5764602467,-0.634699953,6.5033796498,-3.638222383 +050,2,4,27,099,Minnesota,Mower County,39163,39165,39209,39349,39397,39328,39415,39497,39555,39789,40122,40040,40150,44,140,48,-69,87,82,58,234,333,-82,110,126,503,527,477,476,531,490,520,527,561,535,61,370,383,405,374,373,423,431,411,409,416,65,133,144,72,102,158,67,89,116,152,119,11,37,80,77,159,242,185,147,137,125,98,-30,-30,-170,-218,-170,-318,-191,1,84,-360,-108,-19,7,-90,-141,-11,-76,-6,148,221,-235,-10,-2,0,-6,0,-4,0,-3,-3,-4,1,1,632,632,632,632,632,632,632,632,632,632,632,632,12.805824996,13.384806847,12.118132741,12.089963552,13.458029197,12.396903304,13.107481347,13.189673512,13.99665677,13.34330964,9.4197917462,9.7274782211,10.288980629,9.4992570768,9.453568532,10.701816526,10.864085501,10.286443669,10.204336219,10.375358524,3.3860332493,3.6573286262,1.8291521118,2.5907064755,4.004460665,1.6950867783,2.2433958459,2.9032298432,3.7923205509,2.9679511161,0.9419791746,2.0318492368,1.956176564,4.0384542118,6.1334144363,4.6804634924,3.70538415,3.4288145562,3.1186846636,2.4441950368,-0.763766898,-4.317679628,-5.538266116,-4.317844126,-8.059610706,-4.832262308,0.0252066949,2.102338852,-8.981811831,-2.693602694,0.1782122763,-2.285830391,-3.582089552,-0.279389914,-1.926196269,-0.151798816,3.7305908449,5.5311534082,-5.863127167,-0.249407657 +050,2,4,27,101,Minnesota,Murray County,8725,8725,8697,8631,8573,8509,8437,8395,8308,8329,8247,8197,8155,-28,-66,-58,-64,-72,-42,-87,21,-82,-50,-42,32,70,91,89,83,84,100,83,86,88,86,38,86,123,100,105,88,103,104,100,77,89,-6,-16,-32,-11,-22,-4,-3,-21,-14,11,-3,0,9,11,10,9,9,7,4,4,4,4,-23,-59,-38,-65,-58,-47,-90,38,-70,-65,-42,-23,-50,-27,-55,-49,-38,-83,42,-66,-61,-38,1,0,1,2,-1,0,-1,0,-2,0,-1,163,163,163,163,163,163,163,163,163,163,163,163,8.0794090489,10.578935131,10.420325489,9.7958220229,9.9809885932,11.973896905,9.9777604135,10.376447876,10.702991973,10.518590998,9.9261311173,14.299000233,11.708230886,12.392304969,10.456273764,12.333113812,12.502254012,12.065637066,9.3651179762,10.885518591,-1.846722068,-3.720065101,-1.287905397,-2.596482946,-0.475285171,-0.359216907,-2.524493599,-1.689189189,1.3378739966,-0.366927593,1.0387811634,1.2787723785,1.1708230886,1.0621975687,1.069391635,0.8381727833,0.4808559235,0.4826254826,0.4864996351,0.4892367906,-6.809787627,-4.417577308,-7.610350076,-6.845273221,-5.58460076,-10.77650721,4.5681312737,-8.445945946,-7.905619071,-5.136986301,-5.771006464,-3.138804929,-6.439526987,-5.783075652,-4.515209125,-9.938334431,5.0489871972,-7.963320463,-7.419119436,-4.647749511 +050,2,4,27,103,Minnesota,Nicollet County,32727,32729,32758,32971,33030,32996,33392,33545,33766,34081,34234,34311,34482,29,213,59,-34,396,153,221,315,153,77,171,95,404,382,372,386,404,394,369,381,317,339,49,186,200,237,222,230,213,220,263,280,296,46,218,182,135,164,174,181,149,118,37,43,3,0,23,42,70,56,56,44,41,37,33,-18,-4,-147,-212,163,-74,-16,125,-5,1,94,-15,-4,-124,-170,233,-18,40,169,36,38,127,-2,-1,1,1,-1,-3,0,-3,-1,2,1,2720,2720,2736,2796,2745,2875,2886,2878,2851,2833,2869,2870,12.292899633,11.575582188,11.26828825,11.62860758,12.071051885,11.706853263,10.877415361,11.154212106,9.2493982056,9.8556539183,5.6596023064,6.0605142346,7.1789900948,6.6879556546,6.8721334987,6.3288318403,6.48517989,7.6996267291,8.1698154497,8.6055267251,6.6332973269,5.5150679535,4.0892981553,4.940651925,5.1989183859,5.3780214229,4.392235471,3.4545853766,1.0795827559,1.2501271932,0,0.696959137,1.2722260928,2.1088148461,1.6732151127,1.6639182303,1.297035978,1.2003220376,1.0795827559,0.9593999389,-0.121711878,-4.454477962,-6.421712659,4.9105259987,-2.211034256,-0.475405209,3.6847613012,-0.146380736,0.0291779123,2.7328361897,-0.121711878,-3.757518825,-5.149486566,7.0193408447,-0.537819143,1.1885130216,4.9817972792,1.0539413013,1.1087606682,3.6922361287 +050,2,4,27,105,Minnesota,Nobles County,21378,21378,21424,21617,21736,21799,21701,21754,21895,21659,21737,21645,21400,46,193,119,63,-98,53,141,-236,78,-92,-245,101,374,353,347,351,363,405,345,396,385,377,27,164,190,193,198,186,150,185,195,169,171,74,210,163,154,153,177,255,160,201,216,206,45,190,189,168,193,153,138,108,99,89,64,-74,-209,-237,-262,-455,-280,-253,-506,-223,-395,-513,-29,-19,-48,-94,-262,-127,-115,-398,-124,-306,-449,1,2,4,3,11,3,1,2,1,-2,-2,385,385,385,385,385,385,385,385,385,385,385,385,17.378778374,16.284916845,15.941196738,16.137931034,16.706938212,18.557126166,15.842402535,18.250530003,17.749296943,17.516552445,7.6206407844,8.765252693,8.8664293098,9.1034482759,8.5605799103,6.8730096909,8.4952013592,8.9870034105,7.7912498271,7.9451736555,9.7581375897,7.5196641524,7.0747674285,7.0344827586,8.1463583017,11.684116475,7.3472011756,9.2635265923,9.9580471163,9.5713787896,8.8287911526,8.7191197841,7.7179281038,8.8735632184,7.0417673455,6.3231689157,4.9593607935,4.5626325007,4.1030842285,2.9736322453,-9.711670268,-10.93349941,-12.03629264,-20.91954023,-12.88689449,-11.59247635,-23.23552372,-10.27744493,-18.21031764,-23.83552097,-0.882879115,-2.214379628,-4.318364534,-12.04597701,-5.845127143,-5.26930743,-18.27616292,-5.714812425,-14.10723341,-20.86188872 +050,2,4,27,107,Minnesota,Norman County,6852,6845,6832,6806,6602,6598,6583,6623,6539,6590,6477,6388,6338,-13,-26,-204,-4,-15,40,-84,51,-113,-89,-50,16,67,65,68,83,65,76,83,81,72,75,34,102,96,85,93,82,105,110,114,75,85,-18,-35,-31,-17,-10,-17,-29,-27,-33,-3,-10,0,2,2,3,12,15,14,8,6,5,4,6,8,-182,12,-15,42,-70,72,-87,-93,-44,6,10,-180,15,-3,57,-56,80,-81,-88,-40,-1,-1,7,-2,-2,0,1,-2,1,2,0,149,149,149,149,149,149,149,149,149,149,149,149,9.8254876082,9.6957040573,10.303030303,12.593885138,9.8440102983,11.5483969,12.643765709,12.397642917,11.193159736,11.786892975,14.958205015,14.319809069,12.878787879,14.111220696,12.418597607,15.955022033,16.756797928,17.448534476,11.659541391,13.358478705,-5.132717407,-4.624105012,-2.575757576,-1.517335559,-2.574587309,-4.406625133,-4.113032219,-5.050891559,-0.466381656,-1.57158573,0.2932981376,0.2983293556,0.4545454545,1.8208026705,2.2716946842,2.1273362711,1.218676213,0.9183439198,0.7773027594,0.628634292,1.1731925502,-27.14797136,1.8181818182,-2.276003338,6.3607451159,-10.63668136,10.968085917,-13.31598684,-14.45783133,-6.914977212,1.4664906878,-26.849642,2.2727272727,-0.455200668,8.6324398001,-8.509345084,12.18676213,-12.39764292,-13.68052857,-6.28634292 +050,2,4,27,109,Minnesota,Olmsted County,144248,144268,144535,145849,146944,148911,150127,151492,153446,154883,156413,158188,159298,267,1314,1095,1967,1216,1365,1954,1437,1530,1775,1110,553,2185,2092,2156,2192,2230,2161,2103,2070,2042,2049,218,944,925,967,991,989,1051,1040,1168,1100,1147,335,1241,1167,1189,1201,1241,1110,1063,902,942,902,158,469,479,496,696,764,774,500,450,412,326,-228,-394,-528,297,-666,-634,78,-116,182,419,-127,-70,75,-49,793,30,130,852,384,632,831,199,2,-2,-23,-15,-15,-6,-8,-10,-4,2,9,2770,2770,2768,2766,2769,2748,2658,2480,2383,2380,2414,2436,15.049038515,14.289959118,14.574707205,14.66034417,14.786866875,14.173372948,13.641272796,13.299239309,12.981522627,12.907655771,6.5017356328,6.3184570669,6.5369860236,6.6279201974,6.5579423047,6.8932045203,6.7460407552,7.5041118421,6.9929847648,7.2255154558,8.5473028817,7.9715020509,8.037721181,8.0324239729,8.2289245704,7.2801684277,6.8952320411,5.7951274671,5.9885378622,5.6821403148,3.230205521,3.271936146,3.3529938652,4.6549267986,5.0659938532,5.0764417685,3.2432888246,2.8911389803,2.6191906574,2.053633861,-2.713648135,-3.606643601,2.0077402782,-4.454283402,-4.203979192,0.511579403,-0.752443007,1.1693050987,2.6636914695,-0.800035277,0.5165573861,-0.334707455,5.3607341434,0.2006433965,0.8620146609,5.5880211715,2.4908458173,4.0604440789,5.2828821269,1.2535985839 +050,2,4,27,111,Minnesota,Otter Tail County,57303,57301,57291,57283,57227,57503,57496,57539,57840,58213,58602,58684,58741,-10,-8,-56,276,-7,43,301,373,389,82,57,166,560,622,631,672,655,714,712,621,627,615,165,679,692,648,683,688,690,629,708,631,686,1,-119,-70,-17,-11,-33,24,83,-87,-4,-71,12,56,55,60,60,53,39,29,25,24,20,-16,61,-32,238,-44,31,243,264,454,63,109,-4,117,23,298,16,84,282,293,479,87,129,-7,-6,-9,-5,-12,-8,-5,-3,-3,-1,-1,1188,1188,1188,1188,1188,1184,1185,1184,1185,1184,1185,1186,9.7753417006,10.863680028,10.999738517,11.687058148,11.387838484,12.376602328,12.270255831,10.632196208,10.691813175,10.474771131,11.852601812,12.086280674,11.296086464,11.87836416,11.961576911,11.960582082,10.839874885,12.121730942,10.760022509,11.684053651,-2.077260111,-1.222600646,-0.296347947,-0.191306011,-0.573738427,0.4160202463,1.4303809466,-1.489534734,-0.068209334,-1.209282521,0.9775341701,0.9606147935,1.0459339318,1.0434873347,0.9214586865,0.6760329003,0.4997716561,0.4280272225,0.4092560067,0.3406429636,1.0648140067,-0.558903153,4.148871263,-0.765224045,0.5389664015,4.212204994,4.5496454206,7.7729743612,1.0742970175,1.8565041516,2.0423481767,0.4017116409,5.1948051948,0.2782632892,1.460425088,4.8882378942,5.0494170767,8.2010015837,1.4835530242,2.1971471152 +050,2,4,27,113,Minnesota,Pennington County,13930,13932,13971,14075,14130,14155,14129,14258,14242,14192,14175,14069,13874,39,104,55,25,-26,129,-16,-50,-17,-106,-195,54,185,183,185,170,191,196,154,178,153,152,15,165,140,139,135,125,126,129,139,130,133,39,20,43,46,35,66,70,25,39,23,19,4,22,16,21,20,21,11,7,6,5,6,-4,62,0,-39,-79,43,-96,-81,-63,-133,-218,0,84,16,-18,-59,64,-85,-74,-57,-128,-212,0,0,-4,-3,-2,-1,-1,-1,1,-1,-2,327,327,327,327,327,327,327,327,327,327,327,327,13.192612137,12.97642262,13.081138413,12.020930561,13.456864057,13.754385965,10.832102413,12.549793774,10.834159467,10.879289983,11.766383798,9.9273178514,9.8285310235,9.5460330929,8.8068482052,8.8421052632,9.0736442287,9.8001198576,9.2054949724,9.5193787353,1.4262283392,3.0491047687,3.2526073891,2.4748974685,4.6500158523,4.9122807018,1.7584581839,2.7496739169,1.6286644951,1.3599112479,1.5688511731,1.1345506116,1.484885982,1.4142271249,1.4795504985,0.7719298246,0.4923682915,0.4230267564,0.3540574989,0.4294456572,4.4213078514,0,-2.757645395,-5.586197143,3.0295557826,-6.736842105,-5.697404516,-4.441780943,-9.417929472,-15.60319221,5.9901590245,1.1345506116,-1.272759413,-4.171970018,4.509106281,-5.964912281,-5.205036224,-4.018754186,-9.063871973,-15.17374656 +050,2,4,27,115,Minnesota,Pine County,29750,29747,29715,29621,29197,29077,29082,29051,28873,29159,29449,29430,29359,-32,-94,-424,-120,5,-31,-178,286,290,-19,-71,64,331,290,269,297,287,263,269,249,231,230,85,249,241,261,263,317,308,316,262,290,320,-21,82,49,8,34,-30,-45,-47,-13,-59,-90,2,5,4,3,3,5,3,3,3,3,2,-12,-181,-490,-129,-26,-2,-134,330,299,38,16,-10,-176,-486,-126,-23,3,-131,333,302,41,18,-1,0,13,-2,-6,-4,-2,0,1,-1,1,1797,1797,1797,1756,1754,1729,1764,1650,1621,1660,1609,1531,11.156801941,9.8609269271,9.2322476576,10.21338056,9.8739098275,9.0808645812,9.270747174,8.4971334971,7.8466006556,7.8245930361,8.3928812188,8.1947703084,8.9576826715,9.0441720112,10.906025837,10.634624681,10.890543149,8.9407589408,9.8507107797,10.886390311,2.7639207227,1.6661566187,0.2745649861,1.169208549,-1.03211601,-1.553760099,-1.619795975,-0.443625444,-2.004110124,-3.061797275,0.1685317514,0.1360127852,0.1029618698,0.1031654602,0.172019335,0.1035840066,0.1033912324,0.1023751024,0.1019039046,0.0680399394,-6.1008494,-16.66156619,-4.427360401,-0.894100655,-0.068807734,-4.626752296,11.373035567,10.203385203,1.2907827918,0.5443195156,-5.932317649,-16.5255534,-4.324398531,-0.790935195,0.103211601,-4.523168289,11.476426799,10.305760306,1.3926866964,0.612359455 +050,2,4,27,117,Minnesota,Pipestone County,9596,9597,9606,9528,9398,9306,9327,9302,9249,9168,9127,9152,9121,9,-78,-130,-92,21,-25,-53,-81,-41,25,-31,35,117,114,116,121,122,112,130,125,143,131,14,106,113,111,113,103,128,120,122,107,105,21,11,1,5,8,19,-16,10,3,36,26,0,0,5,11,11,41,36,28,25,19,13,-12,-88,-141,-110,3,-85,-73,-119,-70,-30,-69,-12,-88,-136,-99,14,-44,-37,-91,-45,-11,-56,0,-1,5,2,-1,0,0,0,1,0,-1,205,205,205,205,205,205,205,205,205,205,205,205,12.22953904,12.046919582,12.403763901,12.987709977,13.097858178,12.074820764,14.11739154,13.664935775,15.646370152,14.338094456,11.079753319,11.941244848,11.869118905,12.129018408,11.058027806,13.799795159,13.031438345,13.336977316,11.70742382,11.492365786,1.1497857218,0.1056747332,0.5346449957,0.8586915687,2.039830372,-1.724974395,1.0859531954,0.3279584586,3.9389463319,2.8457286707,0,0.5283736659,1.1762189906,1.180700907,4.4017392238,3.8811923886,3.0406689472,2.732987155,2.0788883418,1.4228643354,-9.198285774,-14.90013738,-11.76218991,0.3220093383,-9.125556927,-7.870195677,-12.92284303,-7.652364034,-3.282455277,-7.552126088,-9.198285774,-14.37176371,-10.58597092,1.5027102453,-4.723817704,-3.989003288,-9.882174078,-4.919376879,-1.203566935,-6.129261752 +050,2,4,27,119,Minnesota,Polk County,31600,31600,31639,31545,31524,31652,31511,31519,31692,31636,31364,31330,30900,39,-94,-21,128,-141,8,173,-56,-272,-34,-430,86,382,408,419,398,424,424,436,438,406,394,62,356,360,341,342,355,325,359,353,292,325,24,26,48,78,56,69,99,77,85,114,69,7,42,32,29,66,65,47,32,26,26,19,12,-162,-98,26,-267,-127,30,-166,-383,-173,-517,19,-120,-66,55,-201,-62,77,-134,-357,-147,-498,-4,0,-3,-5,4,1,-3,1,0,-1,-1,1330,1330,1341,1331,1388,1254,1276,1253,1261,1207,1203,1196,12.091668777,12.938210531,13.264530834,12.602314646,13.453910836,13.415386562,13.769580596,13.904761905,12.95179762,12.662702876,11.268675614,11.416068116,10.795238698,10.829124646,11.264477233,10.28302036,11.337796867,11.206349206,9.3150859731,10.445122931,0.8229931628,1.5221424154,2.4692921363,1.7731900005,2.189433603,3.1323662021,2.4317837292,2.6984126984,3.636711647,2.2175799454,1.3294504938,1.0147616103,0.9180701532,2.089831072,2.0625099159,1.4870829444,1.0106114199,0.8253968254,0.8294254634,0.610637956,-5.127880476,-3.107707432,0.8230973788,-8.454316609,-4.029827066,0.9492018794,-5.242546741,-12.15873016,-5.518869429,-16.61578017,-3.798429982,-2.092945821,1.741167532,-6.364485537,-1.967317151,2.4362848238,-4.231935321,-11.33333333,-4.689443966,-16.00514221 +050,2,4,27,121,Minnesota,Pope County,10995,10990,10971,10906,10886,10876,10922,10930,10971,10985,11088,11216,11277,-19,-65,-20,-10,46,8,41,14,103,128,61,22,129,130,131,122,128,123,118,129,118,125,21,151,123,128,124,131,131,115,123,128,138,1,-22,7,3,-2,-3,-8,3,6,-10,-13,0,0,0,1,3,6,6,5,4,3,3,-21,-41,-27,-14,47,7,42,7,93,136,72,-21,-41,-27,-13,50,13,48,12,97,139,75,1,-2,0,0,-2,-2,1,-1,0,-1,-1,184,184,184,184,184,184,184,184,184,184,184,184,11.793207478,11.930983847,12.03933462,11.193687494,11.715174812,11.232363819,10.748770268,11.688488198,10.581061693,11.114568977,13.804452164,11.288546256,11.763624667,11.377190568,11.989749222,11.962924067,10.475496447,11.144837584,11.477761836,12.270484151,-2.011244686,0.6424375918,0.2757099531,-0.183503074,-0.27457441,-0.730560248,0.2732738204,0.5436506139,-0.896700143,-1.155915174,0,0,0.0919033177,0.2752546105,0.5491488193,0.5479201863,0.4554563673,0.3624337426,0.269010043,0.2667496554,-3.748228733,-2.477973568,-1.286646448,4.3123222314,0.6406736226,3.8354413041,0.6376389142,8.426584515,12.195121951,6.4019917308,-3.748228733,-2.477973568,-1.19474313,4.5875768419,1.1898224419,4.3833614903,1.0930952815,8.7890182576,12.464131994,6.6687413862 +050,2,4,27,123,Minnesota,Ramsey County,508640,508611,509364,515856,521091,527261,532966,536838,541635,544919,548900,549632,547903,753,6492,5235,6170,5705,3872,4797,3284,3981,732,-1729,1844,7475,7523,7829,8010,7794,7797,7723,7696,7276,7283,920,3920,3806,4032,3963,4245,4090,4214,4511,4351,4563,924,3555,3717,3797,4047,3549,3707,3509,3185,2925,2720,707,3143,2936,2624,3654,3502,3402,2175,1852,1797,1396,-897,-192,-1342,-159,-1906,-3141,-2291,-2370,-1033,-3987,-5835,-190,2951,1594,2465,1748,361,1111,-195,819,-2190,-4439,19,-14,-76,-92,-90,-38,-21,-30,-23,-3,-10,18384,18385,18282,18230,17883,17989,17920,17866,17507,17388,17426,17338,14.582236008,14.509902628,14.935823082,15.109971732,14.57089336,14.459332779,14.215584315,14.071797985,13.246769325,13.271558538,7.6471391506,7.3407801942,7.6920728915,7.47575755,7.9360331425,7.5847981359,7.7566324361,8.2481653729,7.9214806669,8.3149967883,6.9350968573,7.1691224335,7.2437501908,7.6342141824,6.6348602174,6.874534643,6.4589518791,5.823632612,5.325288658,4.9565617497,6.1313669261,5.6627773647,5.0059521993,6.8928635094,6.5469936549,6.308920112,4.0034825697,3.3863006585,3.2716388781,2.5438824274,-0.374553754,-2.588367583,-0.303333232,-3.595456445,-5.872103675,-4.24859964,-4.36241549,-1.88879513,-7.258778078,-10.63291831,5.7568131718,3.0744097818,4.7026189677,3.2974070647,0.6748899798,2.0603204716,-0.35893292,1.4975055288,-3.9871392,-8.089035885 +050,2,4,27,125,Minnesota,Red Lake County,4089,4089,4078,4083,4058,4029,3993,4027,3983,4002,3961,4032,4046,-11,5,-25,-29,-36,34,-44,19,-41,71,14,16,49,60,60,45,50,46,38,45,44,45,12,50,38,51,36,26,34,30,38,22,29,4,-1,22,9,9,24,12,8,7,22,16,0,2,2,0,2,2,0,0,0,0,0,-17,3,-49,-37,-49,9,-56,11,-48,49,-1,-17,5,-47,-37,-47,11,-56,11,-48,49,-1,2,1,0,-1,2,-1,0,0,0,0,-1,34,34,34,34,34,34,34,34,34,34,34,34,12.008332312,14.740203906,14.8386299,11.219147345,12.46882793,11.485642946,9.5178459612,11.302273013,11.009633429,11.141371627,12.253400319,9.3354624739,12.612835415,8.9753178758,6.4837905237,8.4893882647,7.5140889167,9.5441416552,5.5048167146,7.1799950483,-0.245068006,5.4047414323,2.225794485,2.243829469,5.9850374065,2.9962546816,2.0037570445,1.7581313575,5.5048167146,3.9613765784,0.4901360127,0.4913401302,0,0.4986287709,0.4987531172,0,0,0,0,0,0.7352040191,-12.03783319,-9.150488438,-12.21640489,2.2443890274,-13.98252185,2.7551659361,-12.05575788,12.260728137,-0.247586036,1.2253400319,-11.54649306,-9.150488438,-11.71777612,2.7431421446,-13.98252185,2.7551659361,-12.05575788,12.260728137,-0.247586036 +050,2,4,27,127,Minnesota,Redwood County,16059,16058,16079,16028,15820,15687,15532,15427,15222,15250,15254,15158,15079,21,-51,-208,-133,-155,-105,-205,28,4,-96,-79,50,189,181,180,200,182,203,195,204,183,197,23,190,192,210,178,195,202,185,187,159,170,27,-1,-11,-30,22,-13,1,10,17,24,27,0,6,7,3,4,6,8,5,5,3,4,-4,-55,-209,-106,-183,-98,-214,14,-16,-122,-110,-4,-49,-202,-103,-179,-92,-206,19,-11,-119,-106,-2,-1,5,0,2,0,0,-1,-2,-1,0,373,373,373,373,373,373,373,373,373,373,373,373,11.773133585,11.366490831,11.42603231,12.812710209,11.757485707,13.246761721,12.798634812,13.375295043,12.034723136,13.030393227,11.835425297,12.057272042,13.330371029,11.403312086,12.597306115,13.181506738,12.142294566,12.260687123,10.45639879,11.244501769,-0.062291712,-0.690781211,-1.904338718,1.4093981229,-0.839820408,0.0652549838,0.6563402468,1.1146079203,1.5783243457,1.7858914575,0.3737502725,0.4395880432,0.1904338718,0.2562542042,0.3876094189,0.5220398708,0.3281701234,0.3278258589,0.1972905432,0.2645765122,-3.426044165,-13.124843,-6.728663472,-11.72362984,-6.330953842,-13.96456654,0.9188763455,-1.049042748,-8.023148757,-7.275854086,-3.052293892,-12.68525496,-6.5382296,-11.46737564,-5.943344423,-13.44252667,1.2470464689,-0.72121689,-7.825858214,-7.011277574 +050,2,4,27,129,Minnesota,Renville County,15730,15728,15685,15429,15283,15070,14933,14797,14598,14681,14629,14551,14403,-43,-256,-146,-213,-137,-136,-199,83,-52,-78,-148,52,184,197,186,156,167,176,192,184,165,168,43,206,202,195,171,189,192,176,177,179,188,9,-22,-5,-9,-15,-22,-16,16,7,-14,-20,0,11,9,13,14,17,5,7,8,6,5,-53,-247,-153,-222,-141,-131,-187,61,-65,-71,-133,-53,-236,-144,-209,-127,-114,-182,68,-57,-65,-128,1,2,3,5,5,0,-1,-1,-2,1,0,342,342,342,342,342,342,342,342,342,342,342,342,11.827473163,12.828861683,12.255790202,10.398960104,11.234443323,11.974825651,13.115202022,12.555441829,11.309115833,11.604614216,13.241627563,13.154467309,12.848812309,11.398860114,12.714429869,13.063446164,12.02226852,12.07778915,12.268677176,12.986115908,-1.4141544,-0.325605626,-0.593022107,-0.99990001,-1.479986546,-1.088620514,1.0929335018,0.4776526783,-0.959561343,-1.381501692,0.7070772,0.5860901276,0.8565874872,0.9332400093,1.143625967,0.3401939105,0.478158407,0.5458887752,0.4112405757,0.3453754231,-15.87709713,-9.96353217,-14.62787863,-9.399060094,-8.812647158,-12.72325225,4.1668089757,-4.435346298,-4.866346813,-9.186986254,-15.17001993,-9.377442042,-13.77129114,-8.465820085,-7.669021191,-12.38305834,4.6449673828,-3.889457523,-4.455106237,-8.841610831 +050,2,4,27,131,Minnesota,Rice County,64142,64133,64231,64458,64438,64645,65002,65336,65862,66199,66583,67016,67084,98,227,-20,207,357,334,526,337,384,433,68,150,761,698,739,707,698,770,764,733,744,731,79,440,454,524,455,499,447,565,511,522,528,71,321,244,215,252,199,323,199,222,222,203,28,117,98,122,217,260,241,200,189,172,138,3,-211,-369,-126,-108,-123,-35,-62,-26,38,-275,31,-94,-271,-4,109,137,206,138,163,210,-137,-4,0,7,-4,-4,-2,-3,0,-1,1,2,7278,7278,7355,7263,7310,7338,7283,7262,7259,7312,7328,7328,11.826962677,10.830436941,11.449997289,10.906538524,10.710613942,11.737983811,11.570410644,11.040653101,11.137807918,10.902311708,6.8381912984,7.0444389275,8.118807279,7.019059446,7.6570148383,6.8141282642,8.5566518503,7.6968263771,7.8144297487,7.8747203579,4.9887713791,3.7859980139,3.3311900095,3.8874790778,3.0535991039,4.9238555466,3.0137587933,3.3438267235,3.323378169,3.0275913497,1.8183372316,1.5206057597,1.8902566566,3.3475514281,3.9896269699,3.6738364914,3.0289033098,2.8467713997,2.5748695724,2.0581655481,-3.279223554,-5.725546177,-1.952232285,-1.666062462,-1.887400451,-0.533544719,-0.938960026,-0.391619346,0.5688665334,-4.101416853,-1.460886323,-4.204940417,-0.061975628,1.6814889662,2.1022265187,3.1402917727,2.0899432838,2.4551520537,3.1437361058,-2.043251305 +050,2,4,27,133,Minnesota,Rock County,9687,9686,9658,9601,9483,9430,9386,9456,9405,9481,9411,9334,9301,-28,-57,-118,-53,-44,70,-51,76,-70,-77,-33,36,104,107,110,124,100,105,115,98,100,89,50,136,117,117,124,102,115,109,128,95,115,-14,-32,-10,-7,0,-2,-10,6,-30,5,-26,0,1,0,0,-2,0,-1,-1,-1,-1,0,-13,-28,-108,-47,-41,73,-40,73,-39,-80,-7,-13,-27,-108,-47,-43,73,-41,72,-40,-81,-7,-1,2,0,1,-1,-1,0,-2,0,-1,0,260,260,260,260,260,260,260,260,260,260,260,260,10.800145387,11.213582058,11.632210649,13.180272109,10.614584439,11.13408621,12.178333157,10.374761804,10.66951187,9.5519184331,14.123267044,12.261580381,12.372442235,13.180272109,10.826876128,12.194475372,11.542941862,13.550709295,10.136036276,12.342366515,-3.323121657,-1.047998323,-0.740231587,0,-0.212291689,-1.060389163,0.6353912951,-3.175947491,0.5334755935,-2.790448082,0.1038475518,0,0,-0.212585034,0,-0.106038916,-0.105898549,-0.105864916,-0.106695119,0,-2.90773145,-11.31838189,-4.970126368,-4.357993197,7.7486466405,-4.241556651,7.7305940909,-4.128731738,-8.535609496,-0.751274483,-2.803883898,-11.31838189,-4.970126368,-4.570578231,7.7486466405,-4.347595568,7.6246955417,-4.234596655,-8.642304615,-0.751274483 +050,2,4,27,135,Minnesota,Roseau County,15629,15629,15561,15517,15512,15497,15676,15619,15553,15302,15147,15176,15117,-68,-44,-5,-15,179,-57,-66,-251,-155,29,-59,62,196,172,202,217,183,178,183,151,183,167,41,148,134,131,143,137,133,148,135,113,138,21,48,38,71,74,46,45,35,16,70,29,1,21,16,7,9,8,9,7,7,7,5,-97,-114,-61,-94,99,-111,-121,-295,-179,-47,-93,-96,-93,-45,-87,108,-103,-112,-288,-172,-40,-88,7,1,2,1,-3,0,1,2,1,-1,0,191,191,191,191,191,191,191,191,191,191,191,191,12.613424287,11.086403042,13.028475604,13.922304558,11.695158971,11.420505582,11.861934857,9.9182239154,12.07004584,11.02564949,9.524422421,8.6370814399,8.4491599213,9.1746062298,8.7553922352,8.5332991146,9.5932587911,8.867286282,7.4530884147,9.1110157462,3.0890018663,2.4493216024,4.5793156825,4.7476983287,2.9397667359,2.8872064673,2.2686760655,1.0509376334,4.6169574251,1.9146337438,1.3514383165,1.0312933063,0.4514818279,0.5774227697,0.5112637802,0.5774412935,0.4537352131,0.4597852146,0.4616957425,0.3301092662,-7.336379432,-3.93180573,-6.062755974,6.3516504668,-7.09378495,-7.76337739,-19.12169827,-11.75736477,-3.099957128,-6.140032351,-5.984941116,-2.900512424,-5.611274146,6.9290732365,-6.58252117,-7.185936096,-18.66796305,-11.29757956,-2.638261386,-5.809923085 +050,2,4,27,137,Minnesota,St. Louis County,200226,200229,200143,200437,200397,200503,200720,200383,200023,199872,199850,199212,198538,-86,294,-40,106,217,-337,-360,-151,-22,-638,-674,494,2058,2046,2081,2054,2062,1942,1971,1940,1857,1847,485,2117,2087,2080,2037,2071,2102,2082,2124,2091,2225,9,-59,-41,1,17,-9,-160,-111,-184,-234,-378,44,164,154,158,188,206,184,96,78,74,64,-120,197,-111,-16,49,-509,-375,-124,92,-481,-369,-76,361,43,142,237,-303,-191,-28,170,-407,-305,-19,-8,-42,-37,-37,-25,-9,-12,-8,3,9,9433,9434,9591,9524,9212,9312,9281,8802,8926,9156,8929,8803,10.275101103,10.20871483,10.381641307,10.238695189,10.281648355,9.7001543433,9.8575876167,9.7067461886,9.3068245035,9.2872407291,10.569673973,10.413288294,10.376652532,10.153954285,10.326524608,10.499343167,10.412733343,10.627386033,10.479574602,11.187932118,-0.294572869,-0.204573464,0.0049887753,0.0847409047,-0.044876254,-0.799188823,-0.555145726,-0.920639845,-1.172750099,-1.900691389,0.8188127216,0.7683978904,0.7882264904,0.9371347106,1.0271675854,0.9190671468,0.4801260331,0.3902712385,0.3708696894,0.3218101823,0.983573818,-0.553845233,-0.079820404,0.2442531959,-2.538001461,-1.873098805,-0.620162793,0.4603199223,-2.410652981,-1.855436832,1.8023865395,0.2145526577,0.7084060863,1.1813879065,-1.510833876,-0.954031658,-0.14003676,0.8505911609,-2.039783292,-1.53362665 +050,2,4,27,139,Minnesota,Scott County,129928,129916,130514,132581,135140,137280,139198,141372,143393,145581,147339,149004,150689,598,2067,2559,2140,1918,2174,2021,2188,1758,1665,1685,511,1918,1953,1936,1888,1837,1894,1818,1743,1754,1704,107,560,548,571,584,651,699,712,684,719,776,404,1358,1405,1365,1304,1186,1195,1106,1059,1035,928,66,228,206,200,291,267,284,163,139,110,99,123,482,946,587,353,734,547,927,565,516,651,189,710,1152,787,644,1001,831,1090,704,626,750,5,-1,2,-12,-30,-13,-5,-8,-5,4,7,1287,1287,1286,1287,1309,1287,1315,1299,1310,1291,1289,1289,14.580284688,14.589815517,14.213347038,13.657506203,13.094771358,13.302196548,12.582446864,11.900860303,11.837634093,11.371636975,4.2570174272,4.0938140826,4.1920563835,4.2245675967,4.6405531596,4.9093111864,4.9277789697,4.6702171241,4.852485127,5.1786328009,10.323267261,10.496001434,10.021290654,9.4329386063,8.4542181987,8.3928853616,7.654667894,7.230643179,6.9851489659,6.1930041743,1.7332142382,1.5389155128,1.468320975,2.1050499497,1.9032683466,1.9946271487,1.1281291743,0.949064591,0.7423829819,0.6606760919,3.6640757141,7.067058617,4.3095220615,2.5535485644,5.2322058666,3.8417642618,6.4158021137,3.8577085894,3.4824510786,4.3444458162,5.3972899523,8.6059741298,5.7778430365,4.6585985142,7.1354742132,5.8363914105,7.5439312879,4.8067731804,4.2248340605,5.0051219081 +050,2,4,27,141,Minnesota,Sherburne County,88499,88492,88800,89279,89474,90086,90908,91441,93247,94527,96067,97424,98811,308,479,195,612,822,533,1806,1280,1540,1357,1387,328,1173,1135,1187,1135,1226,1191,1215,1225,1208,1202,68,498,430,502,455,519,544,523,573,548,607,260,675,705,685,680,707,647,692,652,660,595,11,71,60,42,82,69,53,37,31,27,27,43,-267,-581,-110,80,-243,1105,555,861,670,766,54,-196,-521,-68,162,-174,1158,592,892,697,793,-6,0,11,-5,-20,0,1,-4,-4,0,-1,2174,2174,2169,2176,2177,2166,2196,2157,2190,2205,2197,2190,13.173928425,12.699087568,13.221207396,12.541852216,13.446742236,12.897427012,12.941088756,12.854549461,12.486368875,12.250617882,5.5930233211,4.8111080653,5.5914457563,5.0277909765,5.6923810934,5.8910162003,5.5705262709,6.0127810949,5.6643461453,6.1864601116,7.5809051039,7.8879795024,7.6297616396,7.5140612396,7.7543611426,7.0064108117,7.3705624847,6.8417683663,6.8220227297,6.06415777,0.7973989072,0.6713174045,0.4678102027,0.9061073848,0.75679055,0.5739409166,0.3940907687,0.3252988027,0.279082748,0.2751802686,-2.99866913,-6.5005902,-1.225217198,0.8840072047,-2.665218893,11.966126657,5.9113615304,9.034911907,6.9253867105,7.8069661375,-2.201270223,-5.829272795,-0.757406995,1.7901145894,-1.908428343,12.540067573,6.305452299,9.3602107097,7.2044694585,8.0821464061 +050,2,4,27,143,Minnesota,Sibley County,15226,15234,15257,15167,15082,15057,14933,14893,14832,14916,15024,14868,14715,23,-90,-85,-25,-124,-40,-61,84,108,-156,-153,47,190,179,169,178,155,160,163,169,160,168,21,163,140,148,130,150,169,142,141,141,137,26,27,39,21,48,5,-9,21,28,19,31,0,4,12,29,23,19,17,12,11,11,10,-3,-121,-137,-76,-197,-63,-70,53,70,-186,-193,-3,-117,-125,-47,-174,-44,-53,65,81,-175,-183,0,0,1,1,2,-1,1,-2,-1,0,-1,230,230,230,230,230,230,230,230,230,230,230,230,12.490139364,11.835101987,11.214705199,11.870623541,10.393616308,10.765349033,10.958719914,11.289245157,10.705205406,11.357874455,10.715224823,9.2565043473,9.8211619496,8.6695565188,10.058338363,11.370899916,9.5468602931,9.4188376754,9.4339622642,9.2620761924,1.7749145412,2.5785976396,1.3935432496,3.2010670223,0.3352779454,-0.605550883,1.4118596208,1.8704074816,1.271243142,2.0957982625,0.2629503024,0.7934146583,1.9244168685,1.5338446149,1.2740561926,1.1438183347,0.8067769262,0.7348029392,0.7359828717,0.6760639557,-7.954246647,-9.058150683,-5.04329938,-13.13771257,-4.224502112,-4.709840202,3.5632647573,4.6760187041,-12.44480128,-13.04803434,-7.691296345,-8.264736024,-3.118882511,-11.60386796,-2.95044592,-3.566021867,4.3700416835,5.4108216433,-11.70881841,-12.37197039 +050,2,4,27,145,Minnesota,Stearns County,150642,150646,150768,151372,151919,152612,154025,156068,157279,158512,160034,161076,162038,122,604,547,693,1413,2043,1211,1233,1522,1042,962,487,1944,1865,1932,1999,2011,1938,2048,2078,2040,2024,226,921,993,941,937,1036,994,1035,1070,1136,1143,261,1023,872,991,1062,975,944,1013,1008,904,881,53,226,329,402,691,826,896,699,666,644,494,-194,-645,-656,-701,-321,261,-627,-479,-150,-509,-420,-141,-419,-327,-299,370,1087,269,220,516,135,74,2,0,2,1,-19,-19,-2,0,-2,3,7,8213,8214,8173,8037,7932,7812,7648,7645,7486,7312,6842,6843,12.868206792,12.29841967,12.688363418,13.038217828,12.970302458,12.369673238,12.970603975,13.046781313,12.705926318,12.528086063,6.0965115509,6.5481666123,6.1799948117,6.1114607826,6.6818664078,6.3444041271,6.5549683177,6.7180250262,7.0754570085,7.0749023564,6.7716952406,5.7502530573,6.5083686062,6.926757045,6.2884360498,6.0252691106,6.4156356578,6.3287562864,5.6304693096,5.4531837061,1.495995234,2.1695335503,2.6401253074,4.5069577383,5.3274340279,5.7188994948,4.4269786029,4.1814996892,4.0110865436,3.0577443255,-4.26954392,-4.325878447,-4.603800598,-2.093680802,1.683365958,-4.001953106,-3.033652004,-0.941779209,-3.170253184,-2.599701653,-2.773548686,-2.156344896,-1.963675291,2.4132769366,7.0107999858,1.7169463885,1.3933265989,3.2397204799,0.8408333593,0.4580426722 +050,2,4,27,147,Minnesota,Steele County,36576,36581,36497,36576,36324,36379,36505,36628,36671,36814,36783,36687,36596,-84,79,-252,55,126,123,43,143,-31,-96,-91,123,489,443,466,497,493,445,431,396,398,396,91,262,302,287,301,310,320,318,318,320,332,32,227,141,179,196,183,125,113,78,78,64,3,28,22,14,12,2,-1,-3,-4,-3,1,-124,-178,-426,-136,-78,-61,-80,35,-104,-171,-156,-121,-150,-404,-122,-66,-59,-81,32,-108,-174,-155,5,2,11,-2,-4,-1,-1,-2,-1,0,0,594,594,594,594,594,594,594,594,594,594,594,594,13.383876398,12.153635117,12.819278434,13.638109873,13.482285699,12.142048323,11.730285092,10.761308205,10.834354158,10.807417819,7.1709112805,8.2853223594,7.8951350013,8.2597003458,8.4777050032,8.7313605915,8.6548275158,8.6416565893,8.7110385191,9.0607644338,6.2129651171,3.8683127572,4.9241434329,5.3784095275,5.0045806954,3.4106877311,3.0754575764,2.1196516162,2.123315639,1.7466533848,0.7663569307,0.6035665295,0.3851285366,0.3292903792,0.054694871,-0.027285502,-0.081649316,-0.108700083,-0.081665986,0.0272914591,-4.871840488,-11.6872428,-3.741248642,-2.140387465,-1.668193565,-2.182840148,0.9525753555,-2.826202155,-4.654961209,-4.257467626,-4.105483558,-11.08367627,-3.356120105,-1.811097086,-1.613498694,-2.21012565,0.8709260393,-2.934902238,-4.736627195,-4.230176166 +050,2,4,27,149,Minnesota,Stevens County,9726,9722,9705,9707,9734,9753,9862,9886,9804,9710,9751,9822,9765,-17,2,27,19,109,24,-82,-94,41,71,-57,33,103,129,115,126,121,90,121,117,134,123,38,94,76,87,82,91,69,85,78,83,92,-5,9,53,28,44,30,21,36,39,51,31,5,9,9,28,40,57,49,45,48,27,27,-17,-17,-33,-35,25,-64,-152,-177,-46,-5,-115,-12,-8,-24,-7,65,-7,-103,-132,2,22,-88,0,1,-2,-2,0,1,0,2,0,-2,0,892,892,948,1027,1014,1051,1019,1036,1004,927,927,927,10.611992582,13.270922278,11.802740288,12.847310732,12.254405509,9.1416962925,12.401352875,12.024048096,13.692331273,12.55935059,9.6847310942,7.8185278535,8.9290296095,8.3609482539,9.2161231517,7.0086338243,8.7116941683,8.0160320641,8.4810708629,9.3939858069,0.9272614877,5.4523944242,2.8737106789,4.4863624777,3.0382823577,2.1330624683,3.6896587066,4.0080160321,5.2112604097,3.1653647828,0.9272614877,0.9258782984,2.8737106789,4.0785113434,5.7727364796,4.9771457593,4.6120733832,4.9329428087,2.7589025699,2.7569306172,-1.751493921,-3.394887094,-3.592138349,2.5490695896,-6.48166903,-15.43930929,-18.14082197,-4.727403525,-0.510907883,-11.74248226,-0.824232434,-2.469008796,-0.71842767,6.627580933,-0.70893255,-10.46216353,-13.52874859,0.2055392837,2.2479946866,-8.985551641 +050,2,4,27,151,Minnesota,Swift County,9783,9786,9759,9681,9637,9557,9490,9379,9462,9405,9319,9294,9176,-27,-78,-44,-80,-67,-111,83,-57,-86,-25,-118,25,120,111,97,112,100,119,112,107,116,113,38,122,102,99,102,115,110,126,133,97,103,-13,-2,9,-2,10,-15,9,-14,-26,19,10,0,4,6,12,18,14,12,21,23,17,12,-14,-79,-59,-91,-94,-111,62,-64,-84,-60,-140,-14,-75,-53,-79,-76,-97,74,-43,-61,-43,-128,0,-1,0,1,-1,1,0,0,1,-1,0,150,150,150,150,150,150,150,150,150,150,150,150,12.345679012,11.491872865,10.107325206,11.760382212,10.599395834,12.632025901,11.872581757,11.429181799,12.464406598,12.236058473,12.551440329,10.560099389,10.315723664,10.710348086,12.18930521,11.676662598,13.356654476,14.206366161,10.422822758,11.15322144,-0.205761317,0.9317734755,-0.208398458,1.0500341261,-1.589909375,0.9553633034,-1.48407272,-2.777184362,2.0415838393,1.082837033,0.4115226337,0.621182317,1.2503907471,1.890061427,1.4839154168,1.2738177379,2.2261090793,2.4567400128,1.8266802772,1.2994044396,-8.127572016,-6.108292784,-9.482129832,-9.870320785,-11.76532938,6.5813916459,-6.784332432,-8.972441786,-6.447106861,-15.15971846,-7.716049383,-5.487110467,-8.231739085,-7.980259358,-10.28141396,7.8552093838,-4.558223353,-6.515701773,-4.620426584,-13.86031402 +050,2,4,27,153,Minnesota,Todd County,24895,24889,24894,24882,24641,24476,24339,24318,24408,24539,24613,24725,24732,5,-12,-241,-165,-137,-21,90,131,74,112,7,79,306,335,331,297,318,342,327,310,310,308,33,204,194,204,225,239,231,204,200,210,225,46,102,141,127,72,79,111,123,110,100,83,1,7,3,-2,-2,1,19,17,22,5,5,-42,-121,-395,-292,-211,-101,-36,-7,-58,8,-81,-41,-114,-392,-294,-213,-100,-17,10,-36,13,-76,0,0,10,2,4,0,-4,-2,0,-1,0,346,346,346,346,346,346,346,346,346,346,346,346,12.295081967,13.529067302,13.478021866,12.168390863,13.071089463,14.037680089,13.361390892,12.613932292,12.566378856,12.455264169,8.1967213115,7.8347434525,8.3066962559,9.2184779269,9.8238691247,9.4815909371,8.3355466116,8.1380208333,8.5127082573,9.0988131104,4.0983606557,5.6943238495,5.1713256103,2.9499129366,3.2472203383,4.5560891516,5.0258442805,4.4759114583,4.0536705987,3.3564510585,0.281260045,0.1211558266,-0.081438199,-0.081942026,0.0411040549,0.779871116,0.6946288843,0.8951822917,0.2026835299,0.2021958469,-4.861780778,-15.95218383,-11.88997699,-8.644883745,-4.151509546,-1.477650536,-0.286023658,-2.360026042,0.3242936479,-3.27557272,-4.580520733,-15.83102801,-11.97141519,-8.726825771,-4.110405492,-0.69777942,0.4086052261,-1.46484375,0.5269771778,-3.073376873 +050,2,4,27,155,Minnesota,Traverse County,3558,3558,3535,3490,3405,3403,3382,3376,3330,3308,3289,3260,3218,-23,-45,-85,-2,-21,-6,-46,-22,-19,-29,-42,10,30,32,30,33,34,29,38,35,37,33,21,66,57,50,54,52,46,56,70,42,33,-11,-36,-25,-20,-21,-18,-17,-18,-35,-5,0,0,0,0,1,1,4,5,4,4,3,3,-12,-10,-61,17,-2,10,-35,-8,12,-29,-45,-12,-10,-61,18,-1,14,-30,-4,16,-26,-42,0,1,1,0,1,-2,1,0,0,2,0,100,100,100,100,100,100,100,100,100,100,100,100,8.5409252669,9.2820884699,8.8131609871,9.72733972,10.062148565,8.6489710707,11.449231696,10.610883735,11.299435028,10.188329731,18.790035587,16.533720087,14.688601645,15.917464996,15.389168393,13.71905756,16.872551973,21.22176747,12.826385708,10.188329731,-10.24911032,-7.251631617,-5.875440658,-6.190125276,-5.327019828,-5.07008649,-5.423320277,-10.61088374,-1.526950679,0,0,0,0.2937720329,0.2947678703,1.1837821841,1.4912019087,1.2051822838,1.2126724269,0.9161704077,0.9262117938,-2.846975089,-17.69398115,4.9941245593,-0.589535741,2.9594554602,-10.43841336,-2.410364568,3.6380172806,-8.856313941,-13.89317691,-2.846975089,-17.69398115,5.2878965922,-0.29476787,4.1432376443,-8.947211452,-1.205182284,4.8506897074,-7.940143533,-12.96696511 +050,2,4,27,157,Minnesota,Wabasha County,21676,21665,21672,21609,21542,21567,21464,21392,21445,21595,21591,21548,21642,7,-63,-67,25,-103,-72,53,150,-4,-43,94,61,262,219,233,230,227,243,233,235,235,223,28,193,164,191,192,206,195,175,195,197,206,33,69,55,42,38,21,48,58,40,38,17,2,12,8,7,3,6,7,7,8,4,5,-28,-144,-130,-21,-145,-97,-1,87,-50,-86,73,-26,-132,-122,-14,-142,-91,6,94,-42,-82,78,0,0,0,-3,1,-2,-1,-2,-2,1,-1,246,246,246,246,246,246,246,246,246,246,246,246,12.106929137,10.150402076,10.809807697,10.689967698,10.59361583,11.345332306,10.827137546,10.883156579,10.895013793,10.326464459,8.9184630669,7.6012143403,8.8612586699,8.9237991216,9.6135896957,9.1042790111,8.1319702602,9.0307043949,9.1332668815,9.5392451956,3.1884660706,2.5491877361,1.9485490269,1.7661685761,0.980026134,2.241053295,2.6951672862,1.8524521836,1.7617469111,0.7872192637,0.5545158384,0.3707909434,0.3247581711,0.1394343613,0.2800074669,0.3268202722,0.3252788104,0.3704904367,0.1854470433,0.2315350776,-6.65419006,-6.025352831,-0.974274513,-6.739327462,-4.526787381,-0.04668861,4.0427509294,-2.315565229,-3.98711143,3.3804121324,-6.099674222,-5.654561887,-0.649516342,-6.5998931,-4.246779914,0.2801316619,4.3680297398,-1.945074793,-3.801664387,3.61194721 +050,2,4,27,159,Minnesota,Wadena County,13843,13843,13816,13650,13606,13637,13587,13664,13552,13643,13739,13662,13807,-27,-166,-44,31,-50,77,-112,91,96,-77,145,47,174,178,158,184,184,181,180,205,177,178,64,191,173,199,191,193,220,192,226,210,183,-17,-17,5,-41,-7,-9,-39,-12,-21,-33,-5,0,2,1,2,3,3,3,1,1,0,1,-10,-152,-46,70,-44,85,-76,105,117,-45,149,-10,-150,-45,72,-41,88,-73,106,118,-45,150,0,1,-4,0,-2,-2,0,-3,-1,1,0,482,482,482,482,482,482,482,482,482,482,482,482,12.670210442,13.061344291,11.599309914,13.517484572,13.504091593,13.300999412,13.237727523,14.97334015,12.919236524,12.960064072,13.908104566,12.694452598,14.609257424,14.031736703,14.164617812,16.166960611,14.120242692,16.507194507,15.327907741,13.324110816,-1.237894124,0.3668916936,-3.009947509,-0.51425213,-0.660526219,-2.865961199,-0.882515168,-1.533854357,-2.408671216,-0.364046744,0.1456346028,0.0733783387,0.1468267078,0.2203937702,0.2201754064,0.2204585538,0.0735429307,0.0730406837,0,0.0728093487,-11.06822981,-3.375403581,5.1389347722,-3.232441963,6.2383031815,-5.584950029,7.722007722,8.5457599883,-3.284551659,10.848592959,-10.92259521,-3.302025242,5.28576148,-3.012048193,6.4584785879,-5.364491476,7.7955506527,8.618800672,-3.284551659,10.921402308 +050,2,4,27,161,Minnesota,Waseca County,19136,19138,19145,19186,19177,19040,18935,18932,18808,18722,18653,18558,18550,7,41,-9,-137,-105,-3,-124,-86,-69,-95,-8,53,229,220,212,210,206,230,192,207,203,201,23,164,176,172,157,166,186,170,183,174,165,30,65,44,40,53,40,44,22,24,29,36,2,2,6,13,1,1,-1,-3,-3,-4,0,-25,-27,-54,-192,-164,-43,-168,-107,-89,-119,-46,-23,-25,-48,-179,-163,-42,-169,-110,-92,-123,-46,0,1,-5,2,5,-1,1,2,-1,-1,2,1344,1344,1319,1345,1324,1325,1314,1079,1027,959,944,974,11.94855339,11.469384563,11.094539079,11.059907834,10.880185914,12.188659247,10.231814548,11.076923077,10.910752197,10.833243505,8.5570426026,9.1755076506,9.0012298192,8.2685977617,8.7675284549,9.8569157393,9.0594191314,9.7926421405,9.3520733117,8.8929610866,3.3915107876,2.2938769127,2.0933092603,2.7913100724,2.112657459,2.3317435082,1.172395417,1.2842809365,1.5586788853,1.9402824189,0.1043541781,0.3128013972,0.6803255096,0.0526662278,0.0528164365,-0.052994171,-0.159872102,-0.160535117,-0.214990191,0,-1.408781404,-2.815212575,-10.04788445,-8.637261356,-2.271106768,-8.903020668,-5.702104983,-4.762541806,-6.395958184,-2.479249757,-1.304427226,-2.502411177,-9.36755894,-8.584595128,-2.218290332,-8.956014838,-5.861977085,-4.923076923,-6.610948375,-2.479249757 +050,2,4,27,163,Minnesota,Washington County,238136,238109,238933,241428,243720,246002,248580,250482,252655,255717,258969,262541,265476,824,2495,2292,2282,2578,1902,2173,3062,3252,3572,2935,768,2879,2718,2860,2900,2852,2790,2822,2738,2733,2729,336,1319,1337,1400,1469,1512,1577,1724,1672,1694,1903,432,1560,1381,1460,1431,1340,1213,1098,1066,1039,826,108,375,292,268,368,277,396,223,184,167,155,294,565,658,591,817,300,576,1766,2021,2375,1959,402,940,950,859,1185,577,972,1989,2205,2542,2114,-10,-5,-39,-37,-38,-15,-12,-25,-19,-9,-5,3570,3569,3649,3630,3579,3580,3575,3573,3564,3539,3473,3437,11.986818247,11.204828217,11.680096054,11.72707458,11.429441633,11.090418713,11.102106332,10.639496703,10.481102951,10.336788399,5.4917031149,5.5117201349,5.7175295372,5.9403698477,6.0593673732,6.2686703621,6.7824349099,6.4971652619,6.4965197216,7.2081012543,6.4951151322,5.6931080825,5.9625665173,5.7867047325,5.3700742593,4.8217483508,4.3196714217,4.1423314409,3.9845832295,3.1286871445,1.5613257529,1.2037563795,1.0944985114,1.488125326,1.1100825148,1.5741239464,0.8773103161,0.714999048,0.64044793,0.5871023092,2.3523974677,2.7125743072,2.4136142546,3.3037999765,1.2022554312,2.2896348311,6.9476682429,7.8533319344,9.1081666699,7.420215637,3.9137232207,3.9163306867,3.508112766,4.7919253026,2.312337946,3.8637587774,7.824978559,8.5683309824,9.7486145999,8.0073179462 +050,2,4,27,165,Minnesota,Watonwan County,11211,11211,11195,11168,11114,11046,10978,11013,11002,10911,10964,10846,10792,-16,-27,-54,-68,-68,35,-11,-91,53,-118,-54,28,161,153,134,136,162,169,143,168,166,166,40,125,112,127,124,116,114,118,117,125,114,-12,36,41,7,12,46,55,25,51,41,52,6,25,6,20,49,80,44,33,32,25,22,-10,-88,-102,-96,-131,-91,-109,-151,-29,-183,-128,-4,-63,-96,-76,-82,-11,-65,-118,3,-158,-106,0,0,1,1,2,0,-1,2,-1,-1,0,150,150,150,150,150,150,150,150,150,150,150,150,14.398783705,13.733058074,12.093862816,12.350163458,14.733299986,15.353168294,13.051613198,15.36,15.222375057,15.343377392,11.179179895,10.052957544,11.462093863,11.260443153,10.549770361,10.356575062,10.769862639,10.697142857,11.46263182,10.537018209,3.2196038099,3.6801005296,0.6317689531,1.0897203051,4.1835296258,4.9965932319,2.281750559,4.6628571429,3.759743237,4.8063591829,2.2358359791,0.538551297,1.8050541516,4.4496912459,7.275703697,3.9972745855,3.0119107379,2.9257142857,2.2925263641,2.0334596543,-7.870142646,-9.155372049,-8.664259928,-11.89611333,-8.276112955,-9.902339314,-13.78177338,-2.651428571,-16.78129298,-11.83103799,-5.634306667,-8.616820752,-6.859205776,-7.446422085,-1.000409258,-5.905064729,-10.76986264,0.2742857143,-14.48876662,-9.797578334 +050,2,4,27,167,Minnesota,Wilkin County,6576,6576,6591,6577,6594,6499,6470,6369,6337,6342,6255,6223,6161,15,-14,17,-95,-29,-101,-32,5,-87,-32,-62,20,71,70,56,78,69,69,87,74,70,67,6,82,74,82,86,72,81,71,92,69,76,14,-11,-4,-26,-8,-3,-12,16,-18,1,-9,0,-1,0,0,-1,0,-1,0,0,0,0,0,-1,20,-69,-19,-99,-19,-11,-68,-33,-53,0,-2,20,-69,-20,-99,-20,-11,-68,-33,-53,1,-1,1,0,-1,1,0,0,-1,0,0,152,152,152,152,152,152,152,152,152,152,152,152,10.783718104,10.629413105,8.5541892614,12.028683784,10.748500662,10.861010546,13.72347977,11.748829086,11.219746754,10.820413437,12.454434994,11.236808139,12.525777133,13.262394942,11.215826778,12.749881946,11.199621421,14.606652378,11.059464658,12.273901809,-1.670716889,-0.607395035,-3.971587871,-1.233711157,-0.467326116,-1.888871399,2.5238583485,-2.857823291,0.1602820965,-1.453488372,-0.151883354,0,0,-0.154213895,0,-0.15740595,0,0,0,0,-0.151883354,3.0369751727,-10.5399832,-2.930063999,-15.42176182,-2.990713049,-1.735152615,-10.79622132,-5.289309184,-8.559431525,-0.303766707,3.0369751727,-10.5399832,-3.084277893,-15.42176182,-3.148118999,-1.735152615,-10.79622132,-5.289309184,-8.559431525 +050,2,4,27,169,Minnesota,Winona County,51461,51461,51432,51359,51353,51349,51085,50859,50912,50787,50877,50659,50485,-29,-73,-6,-4,-264,-226,53,-125,90,-218,-174,118,425,471,496,499,470,484,456,481,460,462,69,387,395,382,413,447,428,429,428,419,461,49,38,76,114,86,23,56,27,53,41,1,16,61,83,71,92,83,83,59,44,47,34,-97,-170,-159,-190,-453,-333,-84,-212,-6,-308,-211,-81,-109,-76,-119,-361,-250,-1,-153,38,-261,-177,3,-2,-6,1,11,1,-2,1,-1,2,2,4499,4499,4523,4632,4477,4340,4348,4284,4115,3974,3910,3913,8.269206448,9.1712750214,9.6590134564,9.7428588164,9.2207486463,9.5115504417,8.9676397998,9.4625432798,9.060825717,9.1354899945,7.5298421068,7.6914089882,7.4389982668,8.06372884,8.7695205211,8.4110404732,8.4366611274,8.4198929808,8.2532303813,9.1157162066,0.7393643412,1.4798660332,2.2200151896,1.6791299764,0.4512281252,1.1005099685,0.5309786724,1.042650299,0.8075953356,0.0197737879,1.1868743372,1.6161694836,1.3826410391,1.7962785794,1.6283449737,1.631112989,1.1602867285,0.8655964747,0.9257800189,0.6723087875,-3.307682579,-3.096035517,-3.700025316,-8.844719527,-6.532998509,-1.650764953,-4.169165872,-0.118035883,-6.066813741,-4.17226924,-2.120808242,-1.479866033,-2.317384277,-7.048440947,-4.904653535,-0.019651964,-3.008879143,0.7475605918,-5.141033722,-3.499960452 +050,2,4,27,171,Minnesota,Wright County,124700,124695,125093,126239,127273,128235,129845,131029,132392,134280,136471,138542,140249,398,1146,1034,962,1610,1184,1363,1888,2191,2071,1707,500,1881,1831,1831,1776,1754,1792,1745,1761,1721,1731,185,702,637,707,738,740,800,826,819,882,956,315,1179,1194,1124,1038,1014,992,919,942,839,775,12,63,80,77,84,86,61,72,89,35,42,77,-93,-221,-229,511,98,317,904,1164,1202,887,89,-30,-141,-152,595,184,378,976,1253,1237,929,-6,-3,-19,-10,-23,-14,-7,-7,-4,-5,3,1104,1104,1104,1104,1104,1104,1105,1104,1105,1105,1105,1105,14.968249168,14.445075578,14.332232259,13.76317421,13.447104733,13.605597124,13.087238255,13.008262204,12.515771982,12.417904452,5.5862365318,5.0254031367,5.5340732971,5.7191568506,5.6732368883,6.0739272875,6.1948761025,6.0498391511,6.4142422358,6.8581840877,9.3820126367,9.4196724415,8.7981589618,8.044017359,7.7738678442,7.5316698365,6.8923621528,6.9584230529,6.1015297459,5.559720364,0.5013289195,0.6311338319,0.6027208541,0.6509609423,0.6593221249,0.4631369557,0.5399892002,0.6574306281,0.2545334221,0.3013009746,-0.740056976,-1.743507211,-1.792507475,3.9600123993,0.7513205609,2.4067936877,6.7798644027,8.5983061928,8.7414049518,6.3631896295,-0.238728057,-1.112373379,-1.189786621,4.6109733416,1.4106426857,2.8699306433,7.3198536029,9.2557368209,8.9959383738,6.6644906041 +050,2,4,27,173,Minnesota,Yellow Medicine County,10438,10445,10429,10293,10163,10089,9992,9847,9903,9848,9806,9736,9580,-16,-136,-130,-74,-97,-145,56,-55,-42,-70,-156,23,101,137,117,104,115,125,112,113,105,104,33,120,142,121,107,118,107,129,106,84,105,-10,-19,-5,-4,-3,-3,18,-17,7,21,-1,0,1,0,2,3,2,3,3,3,3,2,-6,-117,-129,-71,-98,-145,36,-41,-52,-92,-157,-6,-116,-129,-69,-95,-143,39,-38,-49,-89,-155,0,-1,4,-1,1,1,-1,0,0,-2,0,290,290,290,290,290,290,290,290,290,290,290,290,9.7480938133,13.39460305,11.554414379,10.358049898,11.593326277,12.658227848,11.341197914,11.498931515,10.746085355,10.768275005,11.58189364,13.883457176,11.949437093,10.656839799,11.895760875,10.835443038,13.06262974,10.786608324,8.5968682837,10.871816111,-1.833799826,-0.488854126,-0.395022714,-0.298789901,-0.302434599,1.8227848101,-1.721431826,0.7123231912,2.1492170709,-0.103541106,0.0965157803,0,0.1975113569,0.2987899009,0.2016230657,0.3037974684,0.303782087,0.3052813677,0.3070310101,0.2070822116,-11.2923463,-12.61243645,-7.01165317,-9.760470096,-14.61767226,3.6455696203,-4.151688522,-5.291543706,-9.415617644,-16.25595361,-11.19583052,-12.61243645,-6.814141813,-9.461680195,-14.4160492,3.9493670886,-3.847906435,-4.986262338,-9.108586634,-16.0488714 +040,3,6,28,000,Mississippi,Mississippi,2967297,2968129,2970615,2979147,2984599,2989839,2991892,2990231,2990595,2990674,2982879,2978227,2966786,2486,8532,5452,5240,2053,-1661,364,79,-7795,-4652,-11441,9410,39751,39437,38494,38725,38592,38305,37367,37489,36403,35901,6648,29165,29063,30675,30594,31486,31489,31948,32823,31334,33888,2762,10586,10374,7819,8131,7106,6816,5419,4666,5069,2013,673,2450,2310,2082,2922,3496,1124,2641,2089,730,787,-1078,-4567,-7529,-4732,-9020,-12284,-7555,-7975,-14595,-10437,-14205,-405,-2117,-5219,-2650,-6098,-8788,-6431,-5334,-12506,-9707,-13418,129,63,297,71,20,21,-21,-6,45,-14,-36,92768,92914,93227,93993,96366,96168,94193,95966,97955,94014,93558,90657,13.362215161,13.22558003,12.886232981,12.947757096,12.902442828,12.809267482,12.494672953,12.551658954,12.213505346,12.077685953,9.8037534947,9.7465586227,10.268748291,10.229146045,10.526697629,10.529983651,10.682682889,10.989439618,10.512814233,11.400479696,3.5584616662,3.479021407,2.6174846906,2.7186110509,2.3757451995,2.2792838314,1.8119900643,1.5622193358,1.7006911134,0.6772062567,0.8235623543,0.7746808801,0.6969693216,0.9769747252,1.1688158201,0.3758678149,0.8830901937,0.6994162436,0.2449209928,0.2647597238,-1.535187458,-2.524923094,-1.584082051,-3.015849426,-4.106903185,-2.526406888,-2.666658196,-4.88653905,-3.501699181,-4.778795269,-0.711625104,-1.750242214,-0.887112729,-2.0388747,-2.938087365,-2.150539073,-1.783568002,-4.187122806,-3.256778188,-4.514035545 +050,3,6,28,001,Mississippi,Adams County,32297,32304,32581,32436,32208,32127,32081,31574,31604,31653,31248,30736,30275,277,-145,-228,-81,-46,-507,30,49,-405,-512,-461,79,402,396,312,394,409,389,366,351,341,324,66,413,399,445,424,403,386,412,442,418,436,13,-11,-3,-133,-30,6,3,-46,-91,-77,-112,10,47,74,74,202,177,131,667,194,-23,-8,223,-182,-301,-16,-219,-700,-103,-573,-510,-412,-340,233,-135,-227,58,-17,-523,28,94,-316,-435,-348,31,1,2,-6,1,10,-1,1,2,0,-1,2320,2620,2609,2416,2587,2597,2397,2372,2334,2340,2342,2313,12.365996586,12.251717097,9.6992305899,12.272614004,12.850522347,12.314413245,11.571841851,11.160394906,11.002839442,10.621035551,12.704369626,12.344533135,13.833838502,13.207077,12.662006127,12.219443477,13.026226346,14.053830623,13.487351575,14.29250463,-0.338373041,-0.092816039,-4.134607912,-0.934462995,0.1885162202,0.094969768,-1.454384495,-2.893435716,-2.484512132,-3.671469079,1.4457757202,2.2894622857,2.3004585373,6.2920508348,5.5612284974,4.1470132008,21.088575177,6.1684233955,-0.742127001,-0.262247791,-5.598535768,-9.312542541,-0.497396441,-6.821579865,-21.99355903,-3.2606287,-18.11657208,-16.21595841,-13.29375323,-11.14553113,-4.152760047,-7.023080255,1.8030620968,-0.529529031,-16.43233053,0.8863845009,2.9720030985,-10.04753502,-14.03588023,-11.40777893 +050,3,6,28,003,Mississippi,Alcorn County,37057,37062,37109,37292,37224,37299,37276,37302,37266,37216,36877,37043,36889,47,183,-68,75,-23,26,-36,-50,-339,166,-154,108,447,441,436,437,456,443,424,423,416,414,78,441,448,465,466,474,482,468,464,465,505,30,6,-7,-29,-29,-18,-39,-44,-41,-49,-91,0,9,10,12,19,14,1,25,18,8,2,21,168,-62,95,-6,36,5,-30,-316,206,-66,21,177,-52,107,13,50,6,-5,-298,214,-64,-4,0,-9,-3,-7,-6,-3,-1,0,1,1,435,435,696,744,744,744,741,730,733,688,788,782,12.015967527,11.836384132,11.701085571,11.719745223,12.228807423,11.881772342,11.385301147,11.41808268,11.255411255,11.199480604,11.854679373,12.024263245,12.479368785,12.497485753,12.711523506,12.927797447,12.566794662,12.524799914,12.581168831,13.661202186,0.1612881547,-0.187879113,-0.778283215,-0.77774053,-0.482716082,-1.046025105,-1.181493515,-1.106717234,-1.325757576,-2.461721582,0.2419322321,0.2683987332,0.3220482267,0.5095541401,0.3754458419,0.0268211565,0.6713031336,0.4858758587,0.2164502165,0.054103771,4.5160683324,-1.664072146,2.5495484615,-0.160911834,0.965432165,0.1341057826,-0.80556376,-8.529820631,5.5735930736,-1.785424444,4.7580005645,-1.395673412,2.8715966883,0.3486423064,1.3408780069,0.1609269392,-0.134260627,-8.043944772,5.79004329,-1.731320673 +050,3,6,28,005,Mississippi,Amite County,13131,13135,13137,13141,12937,12856,12605,12553,12442,12450,12322,12286,12205,2,4,-204,-81,-251,-52,-111,8,-128,-36,-81,31,143,146,127,139,125,127,117,140,122,127,11,132,141,152,143,168,170,161,155,165,164,20,11,5,-25,-4,-43,-43,-44,-15,-43,-37,0,-1,-1,0,-1,-1,-2,-1,-1,-1,-1,-18,-4,-216,-56,-250,-6,-66,54,-111,8,-44,-18,-5,-217,-56,-251,-7,-68,53,-112,7,-45,0,-2,8,0,4,-2,0,-1,-1,0,1,116,116,116,116,116,116,116,116,116,115,113,113,10.883628891,11.197177698,9.8476330787,10.918659911,9.9371969155,10.162032406,9.400610638,11.303084127,9.9154746424,10.371156751,10.046426669,10.813712708,11.786143527,11.232865952,13.355592654,13.602720544,12.935883015,12.514128855,13.410273082,13.39267486,0.8372022224,0.3834649896,-1.938510449,-0.314206041,-3.418395739,-3.440688138,-3.535272377,-1.211044728,-3.49479844,-3.021518109,-0.076109293,-0.076692998,0,-0.07855151,-0.079497575,-0.160032006,-0.080347099,-0.080736315,-0.081274382,-0.081662652,-0.304437172,-16.56568755,-4.342263405,-19.63787754,-0.476985452,-5.281056211,4.3387433714,-8.961730987,0.6501950585,-3.59315667,-0.380546465,-16.64238055,-4.342263405,-19.71642905,-0.556483027,-5.441088218,4.2583962719,-9.042467302,0.5689206762,-3.674819321 +050,3,6,28,007,Mississippi,Attala County,19564,19562,19483,19386,19148,19116,18829,18674,18556,18478,18330,18173,18004,-79,-97,-238,-32,-287,-155,-118,-78,-148,-157,-169,54,287,237,255,244,244,239,256,248,207,230,101,274,253,252,293,293,300,278,254,233,271,-47,13,-16,3,-49,-49,-61,-22,-6,-26,-41,1,2,-4,-1,0,0,-2,-1,0,0,0,-32,-113,-223,-29,-241,-105,-54,-55,-140,-134,-126,-31,-111,-227,-30,-241,-105,-56,-56,-140,-134,-126,-1,1,5,-5,3,-1,-1,0,-2,3,-2,343,343,341,343,341,346,346,346,357,350,345,345,14.767552548,12.300825245,13.328454945,12.860719462,13.01229235,12.839108246,13.825133661,13.47533145,11.341533573,12.715261077,14.098639018,13.131260705,13.171649592,15.443404928,15.625416633,16.116035455,15.013231085,13.801347533,12.766074021,14.981894574,0.6689135301,-0.83043546,0.1568053523,-2.582685466,-2.613124283,-3.276927209,-1.188097424,-0.326016083,-1.424540449,-2.266633496,0.1029097739,-0.207608865,-0.052268451,0,0,-0.107440236,-0.054004428,0,0,0,-5.814402223,-11.57419422,-1.515785072,-12.70259586,-5.599552036,-2.900886382,-2.97024356,-7.607041947,-7.341862313,-6.965751721,-5.711492449,-11.78180308,-1.568053523,-12.70259586,-5.599552036,-3.008326618,-3.024247988,-7.607041947,-7.341862313,-6.965751721 +050,3,6,28,009,Mississippi,Benton County,8729,8730,8696,8720,8651,8503,8305,8164,8246,8267,8234,8278,8351,-34,24,-69,-148,-198,-141,82,21,-33,44,73,20,99,81,95,106,94,87,109,102,88,85,38,92,87,99,122,107,108,115,114,78,104,-18,7,-6,-4,-16,-13,-21,-6,-12,10,-19,0,-3,-4,-3,-1,-2,-2,-4,-4,-4,-2,-17,21,-62,-142,-186,-127,106,31,-18,38,94,-17,18,-66,-145,-187,-129,104,27,-22,34,92,1,-1,3,1,5,1,-1,0,1,0,0,78,78,78,78,79,78,78,78,78,78,78,78,11.368856224,9.3258879742,11.076133846,12.613041409,11.415386484,10.603290676,13.201719857,12.362887098,10.658914729,10.223104216,10.564997703,10.016694491,11.542497377,14.516896716,12.994110146,13.162705667,13.928420033,13.817344403,9.4476744186,12.508268687,0.8038585209,-0.690806517,-0.46636353,-1.903855307,-1.578723663,-2.559414991,-0.726700176,-1.454457306,1.2112403101,-2.285164472,-0.344510795,-0.460537678,-0.349772648,-0.118990957,-0.242880563,-0.243753809,-0.484466784,-0.484819102,-0.484496124,-0.240543629,2.4115755627,-7.138334005,-16.55590533,-22.13231794,-15.42291578,12.918951859,3.754617574,-2.181685958,4.6027131783,11.305550544,2.067064768,-7.598871683,-16.90567798,-22.2513089,-15.66579634,12.67519805,3.2701507903,-2.66650506,4.1182170543,11.065006916 +050,3,6,28,011,Mississippi,Bolivar County,34145,34151,34104,33807,34002,33986,33824,33233,32533,31722,31154,30714,30142,-47,-297,195,-16,-162,-591,-700,-811,-568,-440,-572,124,589,570,544,489,482,473,417,434,426,405,74,404,425,404,442,396,404,431,399,398,426,50,185,145,140,47,86,69,-14,35,28,-21,2,-2,8,11,20,23,7,10,16,14,9,-103,-483,45,-163,-225,-706,-780,-810,-622,-481,-558,-101,-485,53,-152,-205,-683,-773,-800,-606,-467,-549,4,3,-3,-4,-4,6,4,3,3,-1,-2,1564,1563,1495,1666,1685,1797,1711,1592,1524,1453,1391,1353,17.346232569,16.81192762,16.002824028,14.422651526,14.375829518,14.38433233,12.979534667,13.804949424,13.77125493,13.31010911,11.897925226,12.535209191,11.884450197,13.036425306,11.810847488,12.285983639,13.41529842,12.691647051,12.866102024,14.000262916,5.4483073434,4.2767184297,4.1183738307,1.3862262203,2.5649820302,2.0983486908,-0.435763754,1.1133023729,0.9051529062,-0.690153806,-0.05890062,0.2359568789,0.3235865153,0.589883498,0.6859835662,0.2128759541,0.3112598241,0.5089382276,0.4525764531,0.2957802024,-14.22449971,1.3272574437,-4.794963817,-6.636189353,-21.05671295,-23.72046346,-25.21204576,-19.7849736,-15.54923385,-18.33837255,-14.28340033,1.5632143226,-4.471377302,-6.046305855,-20.37072938,-23.50758751,-24.90078593,-19.27603537,-15.0966574,-18.04259235 +050,3,6,28,013,Mississippi,Calhoun County,14962,14957,14965,14903,14828,14707,14695,14636,14552,14506,14420,14365,14241,8,-62,-75,-121,-12,-59,-84,-46,-86,-55,-124,46,176,176,183,171,181,173,154,165,183,170,19,187,195,192,179,203,185,161,171,164,189,27,-11,-19,-9,-8,-22,-12,-7,-6,19,-19,1,1,-3,-1,5,12,7,30,9,-3,0,-18,-52,-52,-111,-7,-48,-79,-67,-89,-71,-103,-17,-51,-55,-112,-2,-36,-72,-37,-80,-74,-103,-2,0,-1,0,-2,-1,0,-2,0,0,-2,215,215,217,214,212,214,214,214,217,215,212,212,11.785188161,11.839494131,12.392077197,11.631861778,12.341890832,11.854186652,10.599490674,11.408421489,12.714955706,11.885618402,12.521762421,13.117621338,13.001523616,12.176042446,13.84201016,12.676442374,11.081285704,11.82327318,11.394823693,13.214011047,-0.73657426,-1.278127207,-0.60944642,-0.544180668,-1.500119328,-0.822255722,-0.481795031,-0.414851691,1.3201320132,-1.328392645,0.0669612964,-0.201809559,-0.067716269,0.3401129175,0.818246906,0.4796491709,2.0648358456,0.6222775358,-0.208441897,0,-3.481987411,-3.498032357,-7.516505841,-0.476158084,-3.272987624,-5.4131835,-4.611466722,-6.153633409,-4.933124891,-7.201286443,-3.415026115,-3.699841916,-7.584222109,-0.136045167,-2.454740718,-4.933534329,-2.546630876,-5.531355874,-5.141566788,-7.201286443 +050,3,6,28,015,Mississippi,Carroll County,10597,10601,10606,10437,10403,10326,10239,10209,10199,10100,9902,9928,9732,5,-169,-34,-77,-87,-30,-10,-99,-198,26,-196,16,96,79,100,94,92,90,77,85,92,88,7,96,111,113,117,121,108,116,113,88,120,9,0,-32,-13,-23,-29,-18,-39,-28,4,-32,0,0,-1,0,0,-1,-1,-1,-1,-1,0,-3,-170,1,-64,-64,2,11,-59,-168,23,-163,-3,-170,0,-64,-64,1,10,-60,-169,22,-163,-1,1,-2,0,0,-2,-2,0,-1,0,-1,334,334,334,381,380,380,378,371,363,373,376,365,9.1241743097,7.5815738964,9.6483187805,9.1417456844,8.9984350548,8.8200705606,7.5865806197,8.499150085,9.2788703984,8.9521871821,9.1241743097,10.652591171,10.902600222,11.378555799,11.834898279,10.584084673,11.42913444,11.298870113,8.8754412506,12.207527976,0,-3.071017274,-1.254281441,-2.236810114,-2.836463224,-1.764014112,-3.84255382,-2.799720028,0.4034291478,-3.255340793,0,-0.09596929,0,0,-0.097809077,-0.098000784,-0.098527021,-0.099990001,-0.100857287,0,-16.15739201,0.0959692898,-6.174924019,-6.224167274,0.1956181534,1.0780086241,-5.813094241,-16.79832017,2.3197175996,-16.58189217,-16.15739201,0,-6.174924019,-6.224167274,0.0978090767,0.9800078401,-5.911621262,-16.89831017,2.2188603127,-16.58189217 +050,3,6,28,017,Mississippi,Chickasaw County,17392,17389,17436,17497,17497,17381,17399,17389,17208,17100,17013,17026,16951,47,61,0,-116,18,-10,-181,-108,-87,13,-75,84,250,240,245,236,281,239,231,240,236,228,23,192,153,170,187,193,207,203,208,165,209,61,58,87,75,49,88,32,28,32,71,19,0,12,11,17,29,13,0,0,-2,-3,0,-13,-10,-96,-210,-58,-109,-216,-136,-117,-55,-93,-13,2,-85,-193,-29,-96,-216,-136,-119,-58,-93,-1,1,-2,2,-2,-2,3,0,0,0,-1,206,206,455,495,493,490,494,495,495,453,504,492,14.313113675,13.716637138,14.048970698,13.571017826,16.154995976,13.81622684,13.466246939,14.070882068,13.86644731,13.420843512,10.992471302,8.7443561753,9.7482653822,10.753306498,11.095780154,11.966355464,11.833974583,12.194764459,9.6947618908,12.302439886,3.3206423725,4.9722809625,4.3007053157,2.8177113283,5.0592158215,1.8498713761,1.6322723563,1.8761176091,4.1716854197,1.118403626,0.6870294564,0.6286792021,0.9748265382,1.6676250719,0.7473841555,0,0,-0.117257351,-0.176268398,0,-0.572524547,-5.486654855,-12.04197488,-3.335250144,-6.266528688,-12.48663179,-7.928180016,-6.859555008,-3.231587297,-5.474291432,0.1145049094,-4.857975653,-11.06714835,-1.667625072,-5.519144533,-12.48663179,-7.928180016,-6.976812359,-3.407855695,-5.474291432 +050,3,6,28,019,Mississippi,Choctaw County,8547,8552,8571,8449,8427,8460,8388,8372,8297,8242,8237,8192,8063,19,-122,-22,33,-72,-16,-75,-55,-5,-45,-129,28,95,81,96,90,97,84,78,93,77,76,11,85,74,85,100,91,106,116,123,89,118,17,10,7,11,-10,6,-22,-38,-30,-12,-42,1,1,0,2,3,3,0,1,3,2,1,2,-133,-30,20,-64,-24,-51,-19,23,-34,-88,3,-132,-30,22,-61,-21,-51,-18,26,-32,-87,-1,0,1,0,-1,-1,-2,1,-1,-1,0,121,121,122,122,122,122,122,122,122,122,122,122,11.16333725,9.5994311448,11.369692663,10.683760684,11.575178998,10.078588998,9.432251043,11.287092663,9.373668513,9.3509689326,9.9882491187,8.7698506755,10.066915379,11.870845204,10.859188544,12.718219449,14.027450269,14.928090297,10.83449997,14.518609659,1.1750881316,0.8295804693,1.3027772843,-1.18708452,0.7159904535,-2.639630452,-4.595199226,-3.640997633,-1.460831457,-5.167640726,0.1175088132,0,0.2368685971,0.3561253561,0.3579952267,0,0.1209262954,0.3640997633,0.2434719094,0.1230390649,-15.62867215,-3.555344868,2.3686859715,-7.597340931,-2.863961814,-6.11914332,-2.297599613,2.7914315189,-4.13902246,-10.82743771,-15.51116334,-3.555344868,2.6055545686,-7.241215575,-2.505966587,-6.11914332,-2.176673318,3.1555312822,-3.895550551,-10.70439865 +050,3,6,28,021,Mississippi,Claiborne County,9604,9595,9579,9779,9352,9144,9169,9211,9173,9033,9096,8998,8911,-16,200,-427,-208,25,42,-38,-140,63,-98,-87,35,120,109,112,134,111,130,102,132,110,115,9,89,90,99,112,111,110,95,111,107,112,26,31,19,13,22,0,20,7,21,3,3,1,7,1,11,14,12,2,3,5,4,4,-47,162,-468,-236,-11,30,-60,-151,38,-104,-95,-46,169,-467,-225,3,42,-58,-148,43,-100,-91,4,0,21,4,0,0,0,1,-1,-1,1,899,899,1067,1098,1017,1104,1165,1162,1213,1304,1294,1292,12.397974997,11.395117872,12.110726644,14.634412712,12.078346028,14.142732811,11.205097221,14.562303492,12.15872665,12.842704785,9.1951647898,9.4088129214,10.705017301,12.231747939,12.078346028,11.966927763,10.43611996,12.245573391,11.827125014,12.507677704,3.2028102077,1.9863049501,1.4057093426,2.4026647737,0,2.1758050479,0.7689772602,2.3167301009,0.3316016359,0.3350270814,0.7232152082,0.1045423658,1.1894463668,1.5289684923,1.3057671382,0.2175805048,0.329561683,0.551602405,0.4421355145,0.4467027751,16.737266247,-48.92582719,-25.51903114,-1.201332387,3.2644178455,-6.527415144,-16.58793804,4.1921782779,-11.49552338,-10.60919091,17.460481455,-48.82128483,-24.32958478,0.3276361055,4.5701849837,-6.309834639,-16.25837636,4.7437806829,-11.05338786,-10.16248813 +050,3,6,28,023,Mississippi,Clarke County,16732,16724,16723,16692,16526,16414,16273,16021,15897,15798,15558,15506,15299,-1,-31,-166,-112,-141,-252,-124,-99,-240,-52,-207,46,185,195,176,184,190,195,187,211,188,189,21,209,200,199,213,221,237,223,231,187,212,25,-24,-5,-23,-29,-31,-42,-36,-20,1,-23,0,3,2,2,6,2,-3,-3,-3,-3,0,-26,-10,-164,-91,-119,-224,-78,-59,-216,-51,-182,-26,-7,-162,-89,-113,-222,-81,-62,-219,-54,-182,0,0,1,0,1,1,-1,-1,-1,1,-2,52,52,52,52,52,52,52,52,53,53,52,52,11.072871465,11.740622554,10.686095932,11.258298406,11.766891683,12.218810702,11.799968449,13.458349279,12.104043266,12.27073527,12.509352087,12.041664158,12.082574378,13.032704133,13.686752957,14.850554546,14.071620129,14.734022197,12.039660057,13.763999351,-1.436480622,-0.301041604,-1.396478446,-1.774405727,-1.919861275,-2.631743844,-2.27165168,-1.275672917,0.0643832089,-1.493264081,0.1795600778,0.1204166416,0.1214329083,0.3671184263,0.1238620177,-0.187981703,-0.189304307,-0.191350938,-0.193149627,0,-0.598533593,-9.87416461,-5.525197328,-7.281182121,-13.87254598,-4.887524281,-3.722984698,-13.77726751,-3.283543652,-11.81626359,-0.418973515,-9.753747968,-5.40376442,-6.914063695,-13.74868397,-5.075505984,-3.912289005,-13.96861845,-3.476693278,-11.81626359 +050,3,6,28,025,Mississippi,Clay County,20634,20658,20569,20504,20406,20365,20156,20019,19853,19633,19387,19349,19352,-89,-65,-98,-41,-209,-137,-166,-220,-246,-38,3,48,258,233,228,203,229,221,222,231,239,237,80,200,231,228,255,238,245,253,235,200,241,-32,58,2,0,-52,-9,-24,-31,-4,39,-4,1,5,0,0,4,8,3,5,7,2,4,-60,-128,-97,-41,-158,-135,-146,-196,-248,-79,2,-59,-123,-97,-41,-154,-127,-143,-191,-241,-77,6,2,0,-3,0,-3,-1,1,2,-1,0,1,303,303,303,303,303,303,303,303,304,304,303,303,12.56299759,11.390857981,11.184420299,10.019496064,11.400124456,11.085473515,11.244491719,11.840082009,12.339942173,12.247745536,9.7387578214,11.293082376,11.184420299,12.586066484,11.848164281,12.289325843,12.81466849,12.045105074,10.326311442,12.454458541,2.8242397682,0.097775605,0,-2.56657042,-0.448039826,-1.203852327,-1.570176772,-0.205023065,2.0136307311,-0.206713005,0.2434689455,0,0,0.1974284939,0.3982576229,0.1504815409,0.253254318,0.3587903639,0.1032631144,0.2067130048,-6.232805006,-4.742116842,-2.011233475,-7.798425508,-6.720597386,-7.323434992,-9.927569265,-12.71143004,-4.078893019,0.1033565024,-5.98933606,-4.742116842,-2.011233475,-7.600997014,-6.322339764,-7.172953451,-9.674314947,-12.35263967,-3.975629905,0.3100695072 +050,3,6,28,027,Mississippi,Coahoma County,26151,26151,26111,25861,25628,25196,24860,24525,23876,23236,22652,22095,21564,-40,-250,-233,-432,-336,-335,-649,-640,-584,-557,-531,116,455,429,437,431,417,421,369,380,331,329,95,308,284,318,305,298,298,265,316,311,310,21,147,145,119,126,119,123,104,64,20,19,3,11,1,3,3,-1,-6,-7,-7,-7,-6,-67,-410,-386,-566,-472,-457,-769,-741,-644,-568,-541,-64,-399,-385,-563,-469,-458,-775,-748,-651,-575,-547,3,2,7,12,7,4,3,4,3,-2,-3,667,667,661,665,685,706,734,734,758,732,724,758,17.509428154,16.663753423,17.196600031,17.220712802,16.887718943,17.396334786,15.664798777,16.562064156,14.794287885,15.071348405,11.852535981,11.031482453,12.513773021,12.186351287,12.068441835,12.31379517,11.24978774,13.772663877,13.900373209,14.200966582,5.6568921727,5.6322709705,4.6828270109,5.0343615151,4.8192771084,5.082539617,4.4150110375,2.7894002789,0.8939146758,0.8703818228,0.4233048565,0.0388432481,0.1180544625,0.1198657504,-0.040498127,-0.247928762,-0.297164204,-0.305090656,-0.312870137,-0.274857418,-15.77772647,-14.99349376,-22.27294192,-18.85887806,-18.50764402,-31.77620297,-31.45695364,-28.06834031,-25.38717679,-24.78297716,-15.35442161,-14.95465051,-22.15488745,-18.73901231,-18.54814215,-32.02413173,-31.75411785,-28.37343096,-25.70004693,-25.05783458 +050,3,6,28,029,Mississippi,Copiah County,29449,29451,29436,29280,29047,28941,28976,28868,28666,28536,28459,28099,27933,-15,-156,-233,-106,35,-108,-202,-130,-77,-360,-166,87,421,377,371,364,341,369,355,354,344,353,43,318,315,345,314,333,326,363,311,328,343,44,103,62,26,50,8,43,-8,43,16,10,2,2,7,21,39,32,13,24,25,20,13,-61,-263,-307,-149,-48,-148,-259,-145,-144,-395,-188,-59,-261,-300,-128,-9,-116,-246,-121,-119,-375,-175,0,2,5,-4,-6,0,1,-1,-1,-1,-1,1027,1022,1026,1033,1046,1040,1042,1040,1035,959,861,987,14.340213911,12.927117801,12.795750845,12.569711829,11.790332619,12.827197831,12.412153421,12.422142293,12.164503695,12.59994289,10.831800531,10.801172699,11.899013589,10.843103061,11.513726575,11.33242952,12.691863921,10.913238003,11.598712826,12.243003998,3.5084133797,2.1259451026,0.896737256,1.7266087677,0.2766060438,1.4947683109,-0.2797105,1.5089042898,0.5657908695,0.3569388921,0.0681245316,0.24002606,0.7242877837,1.3467548388,1.1064241754,0.4519066986,0.8391314989,0.877269936,0.7072385869,0.4640205597,-8.958375911,-10.5268572,-5.138994275,-1.657544417,-5.117211811,-9.003371919,-5.069752806,-5.053074831,-13.96796209,-6.710451171,-8.89025138,-10.28683114,-4.414706491,-0.310789578,-4.010787636,-8.551465221,-4.230621307,-4.175804895,-13.26072351,-6.246430611 +050,3,6,28,031,Mississippi,Covington County,19568,19573,19578,19488,19447,19214,19161,19253,19171,19016,18781,18562,18518,5,-90,-41,-233,-53,92,-82,-155,-235,-219,-44,73,258,286,275,260,265,253,253,265,234,226,85,242,263,286,255,262,280,279,272,240,240,-12,16,23,-11,5,3,-27,-26,-7,-6,-14,0,-2,7,9,3,5,0,0,0,0,0,19,-103,-70,-234,-59,87,-54,-130,-228,-214,-29,19,-105,-63,-225,-56,92,-54,-130,-228,-214,-29,-2,-1,-1,3,-2,-3,-1,1,0,1,-1,240,240,240,239,219,228,229,228,237,237,237,237,13.208416526,14.69115192,14.226222809,13.550488599,13.797053158,13.1688528,13.250582659,14.0222769,12.532469271,12.189859763,12.38928992,13.509695647,14.795271721,13.28990228,13.640860103,14.574224443,14.612302616,14.392676667,12.853814637,12.944983819,0.8191266063,1.1814562733,-0.569048912,0.2605863192,0.1561930546,-1.405371643,-1.361719957,-0.370399767,-0.321345366,-0.755124056,-0.102390826,0.3595736484,0.4655854737,0.1563517915,0.2603217577,0,0,0,0,0,-5.273127528,-3.595736484,-12.10522232,-3.074918567,4.5295985838,-2.810743285,-6.808599785,-12.06444956,-11.46131805,-1.564185545,-5.375518354,-3.236162835,-11.63963684,-2.918566775,4.7899203415,-2.810743285,-6.808599785,-12.06444956,-11.46131805,-1.564185545 +050,3,6,28,033,Mississippi,DeSoto County,161252,161267,161797,164133,166521,168502,170923,173470,175950,179265,182406,185385,188275,530,2336,2388,1981,2421,2547,2480,3315,3141,2979,2890,491,2023,2078,2106,2018,2126,2150,2157,2138,2146,2129,219,1099,1175,1258,1247,1279,1340,1417,1444,1482,1568,272,924,903,848,771,847,810,740,694,664,561,23,131,22,46,126,150,32,220,115,1,9,234,1280,1458,1095,1521,1556,1641,2357,2335,2321,2329,257,1411,1480,1141,1647,1706,1673,2577,2450,2322,2338,1,1,5,-8,3,-6,-3,-2,-3,-7,-9,610,610,609,609,609,609,609,609,607,615,627,627,12.413708465,12.569029862,12.572271158,11.890697503,12.346360118,12.306107263,12.1447574,11.822899818,11.66967109,11.39538618,6.7437793391,7.1071270875,7.5099321539,7.3477204095,7.4275609551,7.6698528991,7.9782666836,7.9851577815,8.0589247698,8.3926564256,5.6699291259,5.4619027745,5.0623390036,4.5429770936,4.9187991626,4.6362543644,4.1664907169,3.8377420363,3.6107463206,3.0027297543,0.8038535882,0.1330696136,0.274608012,0.7424320542,0.8710978446,0.1831606662,1.2386864293,0.6359370809,0.005437871,0.0481721351,7.854447274,8.8188862073,6.5368646332,8.9622155115,9.0361883081,9.392707916,13.270835973,12.912287687,12.621298509,12.465878071,8.6583008621,8.9519558209,6.8114726452,9.7046475657,9.9072861527,9.5758685822,14.509522402,13.548224768,12.62673638,12.514050206 +050,3,6,28,035,Mississippi,Forrest County,74934,74859,74944,75796,76433,76614,75861,75642,75593,75190,74983,75035,75009,85,852,637,181,-753,-219,-49,-403,-207,52,-26,261,1159,1022,1130,1041,1074,1032,1009,1018,1070,1040,128,694,705,766,712,722,758,774,842,788,791,133,465,317,364,329,352,274,235,176,282,249,29,140,139,141,162,226,55,86,137,119,87,-74,247,177,-318,-1272,-804,-374,-728,-519,-349,-365,-45,387,316,-177,-1110,-578,-319,-642,-382,-230,-278,-3,0,4,-6,28,7,-4,4,-1,0,3,3601,3593,3678,3661,3565,3268,3087,3089,2918,2885,2988,2823,15.377471142,13.427139376,14.766705653,13.654697491,14.177937071,13.647634476,13.383471612,13.55769679,14.264954872,13.862600304,9.2079076556,9.2623613109,10.009996929,9.3392359403,9.5311643994,10.024134625,10.266409343,11.213733494,10.505406018,10.543573885,6.1695634868,4.1647780646,4.7567087235,4.3154615511,4.6467726712,3.6234998512,3.1170622683,2.3439632957,3.7595488541,3.3190264189,1.8575029853,1.8261960599,1.8425712363,2.1249385145,2.9834392718,0.7273448606,1.1407121492,1.8245623381,1.5864762895,1.1596598331,3.2771659812,2.3254439036,-4.155586192,-16.68470241,-10.61365121,-4.945945052,-9.656260984,-6.912028128,-4.652775,-4.86523953,5.1346689664,4.1516399635,-2.313014956,-14.5597639,-7.630211943,-4.218600192,-8.515548835,-5.087465789,-3.066298711,-3.705579697 +050,3,6,28,037,Mississippi,Franklin County,8118,8114,8105,7981,7898,7874,7775,7734,7723,7761,7746,7694,7657,-9,-124,-83,-24,-99,-41,-11,38,-15,-52,-37,21,96,84,99,71,88,85,77,91,87,84,36,93,107,101,118,121,92,81,108,91,87,-15,3,-23,-2,-47,-33,-7,-4,-17,-4,-3,0,0,0,0,5,6,4,2,3,3,2,6,-128,-60,-21,-58,-15,-7,39,-1,-52,-36,6,-128,-60,-21,-53,-9,-3,41,2,-49,-34,0,1,0,-1,1,1,-1,1,0,1,0,67,67,67,67,67,67,67,67,67,67,67,67,11.935844834,10.580011336,12.553892975,9.0740622404,11.348249404,10.998253219,9.9457504521,11.736635068,11.269430052,10.943912449,11.562849683,13.476919201,12.807506974,15.080835836,15.60384293,11.903991719,10.462412813,13.929193268,11.787564767,11.334766465,0.3729951511,-2.896907866,-0.253613999,-6.006773596,-4.255593526,-0.9057385,-0.516662361,-2.1925582,-0.518134715,-0.390854016,0,0,0,0.6390184676,0.7737442775,0.5175648573,0.2583311806,0.3869220352,0.3886010363,0.260569344,-15.91445978,-7.557150954,-2.662946995,-7.412614225,-1.934360694,-0.9057385,5.0374580212,-0.128974012,-6.735751295,-4.690248192,-15.91445978,-7.557150954,-2.662946995,-6.773595757,-1.160616416,-0.388173643,5.2957892018,0.2579480235,-6.347150259,-4.429678848 +050,3,6,28,039,Mississippi,George County,22578,22582,22653,22860,22918,23223,23332,23391,23651,23937,24040,24435,24425,71,207,58,305,109,59,260,286,103,395,-10,92,370,361,362,375,340,375,365,360,342,351,89,236,229,264,242,268,267,294,288,265,282,3,134,132,98,133,72,108,71,72,77,69,2,19,26,45,65,31,21,0,5,2,1,61,55,-97,161,-87,-40,132,216,27,318,-82,63,74,-71,206,-22,-9,153,216,32,320,-81,5,-1,-3,1,-2,-4,-1,-1,-1,-2,2,564,564,550,599,570,574,559,585,634,522,608,570,16.259090809,15.771768098,15.691034004,16.109977446,14.553859983,15.943199694,15.340001681,15.007190946,14.110366168,14.367580843,10.370663327,10.004805802,11.44318502,10.396305445,11.471866104,11.351558182,12.356056149,12.005752757,10.933470861,11.543184609,5.8884274823,5.7669622963,4.2478489846,5.7136720009,3.0819938788,4.5916415118,2.9839455325,3.0014381891,3.1768953069,2.8243962341,0.8349262848,1.1359168159,1.9505429011,2.7923960906,1.3269695867,0.8928191829,0,0.2084332076,0.0825167612,0.0409332788,2.416891877,-4.237843506,6.9786090462,-3.737514767,-1.712218822,5.6120062922,9.0779188031,1.1255393209,13.120165034,-3.356528858,3.2518181618,-3.10192669,8.9291519473,-0.945118677,-0.385249235,6.5048254751,9.0779188031,1.3339725285,13.202681795,-3.315595579 +050,3,6,28,041,Mississippi,Greene County,14400,14387,14384,14319,14331,14286,14337,13545,13547,13526,13975,13569,13477,-3,-65,12,-45,51,-792,2,-21,449,-406,-92,32,133,125,137,118,126,109,168,132,134,125,11,133,124,120,121,136,145,175,127,114,130,21,0,1,17,-3,-10,-36,-7,5,20,-5,0,0,-1,0,0,6,4,7,8,5,5,-24,-64,12,-61,56,-805,32,-18,431,-432,-92,-24,-64,11,-61,56,-799,36,-11,439,-427,-87,0,-1,0,-1,-2,17,2,-3,5,1,0,3042,3042,3043,3109,3147,3107,2405,2489,2589,2973,2609,2559,9.2673239731,8.7260034904,9.5747283083,8.2451175628,9.0380890897,8.0466558394,12.410889078,9.5996509218,9.7298867267,9.2435110552,9.2673239731,8.6561954625,8.3866233358,8.4547391958,9.7553977477,10.704266942,12.928009456,9.2360277808,8.2776648272,9.6132514974,0,0.0698080279,1.1881049726,-0.209621633,-0.717308658,-2.657611103,-0.517120378,0.363623141,1.4522218995,-0.369740442,0,-0.069808028,0,0,0.4303851947,0.2952901225,0.5171203782,0.5817970256,0.3630554749,0.3697404422,-4.459464168,0.8376963351,-4.263200196,3.9129371484,-57.74334696,2.3623209804,-1.329738115,31.344314752,-31.36799303,-6.803224137,-4.459464168,0.7678883072,-4.263200196,3.9129371484,-57.31296177,2.6576111029,-0.812617737,31.926111778,-31.00493755,-6.433483694 +050,3,6,28,043,Mississippi,Grenada County,21906,21903,21837,21609,21622,21542,21611,21461,21225,21051,21016,20732,20610,-66,-228,13,-80,69,-150,-236,-174,-35,-284,-122,54,262,298,262,286,274,270,270,268,257,254,94,256,289,305,301,286,301,297,316,328,271,-40,6,9,-43,-15,-12,-31,-27,-48,-71,-17,0,0,1,-2,-2,-1,-5,-5,-5,-5,-2,-26,-235,9,-32,90,-136,-202,-141,18,-208,-103,-26,-235,10,-34,88,-137,-207,-146,13,-213,-105,0,1,-6,-3,-4,-1,2,-1,0,0,0,256,256,259,255,246,255,255,255,257,248,226,226,12.060949224,13.786403275,12.139746085,13.255161866,12.722882615,12.650517734,12.773204655,12.74157891,12.31196704,12.287746118,11.78474428,13.370035391,14.13214716,13.950362663,13.280089153,14.102984585,14.050525121,15.023652744,15.713327585,13.110154322,0.2762049441,0.4163678842,-1.992401075,-0.695200797,-0.557206538,-1.452466851,-1.277320466,-2.282073835,-3.401360544,-0.822408205,0,0.0462630982,-0.092669817,-0.09269344,-0.046433878,-0.234268847,-0.236540827,-0.237716024,-0.239532433,-0.096753906,-10.81802698,0.4163678842,-1.482717079,4.171204783,-6.315007429,-9.464461416,-6.67045132,0.855777688,-9.9645492,-4.982826182,-10.81802698,0.4626309824,-1.575386896,4.0785113434,-6.361441308,-9.698730263,-6.906992147,0.6180616635,-10.20408163,-5.079580088 +050,3,6,28,045,Mississippi,Hancock County,43929,44037,44102,44767,45296,45561,46029,46360,46708,47020,47295,47673,48000,65,665,529,265,468,331,348,312,275,378,327,121,431,479,475,515,522,477,446,473,475,473,135,419,391,462,484,515,512,533,510,462,536,-14,12,88,13,31,7,-35,-87,-37,13,-63,23,34,45,30,42,44,0,-19,-33,-19,-14,58,616,391,223,393,278,382,419,345,384,404,81,650,436,253,435,322,382,400,312,365,390,-2,3,5,-1,2,2,1,-1,0,0,0,547,547,549,549,548,548,548,548,550,554,557,558,9.6996703012,10.636998545,10.455991283,11.245769189,11.300046542,10.250569476,9.5168999659,10.030217887,10.003369556,9.887847146,9.4296098752,8.6828109212,10.169827311,10.568839393,11.148513351,11.002707698,11.373335609,10.814822669,9.7295931261,11.20483313,0.270060426,1.9541876242,0.286163972,0.6769297958,0.1515331912,-0.752138222,-1.856435644,-0.784604782,0.27377643,-1.316985984,0.7651712071,0.9993004897,0.6603783968,0.9171306911,0.9524943446,0,-0.405428474,-0.699782643,-0.400134782,-0.292663552,13.863101869,8.6828109212,4.9088127497,8.5817228955,6.0180324498,8.2090514463,8.9407647661,7.3159094524,8.0869345464,8.445433926,14.628273076,9.6821114109,5.5691911465,9.4988535866,6.9705267943,8.2090514463,8.5353362922,6.6161268091,7.6867997641,8.1527703741 +050,3,6,28,047,Mississippi,Harrison County,187105,187109,187868,191130,193633,196255,198502,200880,202740,205096,206351,207859,208801,759,3262,2503,2622,2247,2378,1860,2356,1255,1508,942,668,2780,2791,2742,2830,2751,2779,2788,2648,2638,2624,432,1675,1747,1923,1912,1995,1963,1996,2189,2170,2201,236,1105,1044,819,918,756,816,792,459,468,423,125,324,664,408,446,606,163,116,34,53,54,388,1827,820,1382,910,1029,884,1443,765,984,452,513,2151,1484,1790,1356,1635,1047,1559,799,1037,506,10,6,-25,13,-27,-13,-3,5,-3,3,13,5452,5446,5283,5161,5403,5264,5087,5072,5226,5191,5151,5136,14.670262112,14.507631971,14.065577807,14.337934476,13.776284359,13.770378078,13.67216234,12.87164568,12.737500302,12.595401526,8.8390967762,9.0809147449,9.8643713066,9.6869719853,9.9904352224,9.7269709132,9.7882482174,10.640495617,10.477776973,10.56496904,5.831165336,5.4267172259,4.2012065003,4.6509624908,3.7858491369,4.0434071652,3.8839141223,2.2311500631,2.2597233287,2.0304324869,1.7097715555,3.4514753238,2.0929087328,2.2596179422,3.0346885939,0.8076904019,0.5688561088,0.165270375,0.2559088385,0.2592041473,9.641211827,4.2623641047,7.0892153644,4.6104312273,5.1529613252,4.3803577623,7.0763738365,3.7185834385,4.7512131527,2.1696347142,11.350983382,7.7138394284,9.1821240972,6.8700491695,8.1876499191,5.1880481641,7.6452299454,3.8838538135,5.0071219913,2.4288388614 +050,3,6,28,049,Mississippi,Hinds County,245285,245360,245717,248221,248036,246313,245370,244321,242263,240007,235867,231919,227966,357,2504,-185,-1723,-943,-1049,-2058,-2256,-4140,-3948,-3953,821,3454,3443,3306,3381,3295,3206,3140,3073,3048,2889,403,1996,2001,2092,2211,2100,2171,2216,2257,2225,2340,418,1458,1442,1214,1170,1195,1035,924,816,823,549,73,288,190,250,339,365,107,104,193,148,117,-107,751,-1822,-3268,-2483,-2628,-3212,-3294,-5173,-4910,-4594,-34,1039,-1632,-3018,-2144,-2263,-3105,-3190,-4980,-4762,-4477,-27,7,5,81,31,19,12,10,24,-9,-25,7923,7930,7996,7682,8335,8962,9325,9313,9631,8441,8293,8010,13.985560941,13.875874799,13.375166128,13.752763468,13.457466035,13.177580849,13.021751301,12.915183431,13.03159992,12.564010568,8.0819859982,8.0643698729,8.4636562429,8.9935995347,8.57683723,8.9234335695,9.1898728928,9.485704199,9.512896923,10.176457158,5.9035749426,5.8115049259,4.9115098847,4.7591639329,4.8806288047,4.2541472798,3.8318784084,3.4294792319,3.5187029967,2.3875534101,1.1661382603,0.7657322718,1.0114311954,1.3789372421,1.4907359947,0.4398007333,0.4312936737,0.811139083,0.6327679751,0.5088228579,3.0408674773,-7.342969469,-13.22142859,-10.10000346,-10.73329916,-13.20224257,-13.6603977,-21.7410491,-20.99250512,-19.97890777,4.2070057376,-6.577237198,-12.20999739,-8.721066215,-9.242563167,-12.76244184,-13.22910403,-20.92991002,-20.35973714,-19.47008491 +050,3,6,28,051,Mississippi,Holmes County,19198,19483,19406,19081,18921,18801,18508,18362,18002,17846,17458,17036,16726,-77,-325,-160,-120,-293,-146,-360,-156,-388,-422,-310,82,304,278,257,265,274,229,255,222,221,211,69,218,192,199,219,238,207,230,210,222,250,13,86,86,58,46,36,22,25,12,-1,-39,0,-1,0,0,0,0,0,0,0,0,0,-95,-412,-252,-177,-345,-184,-383,-181,-401,-421,-269,-95,-413,-252,-177,-345,-184,-383,-181,-401,-421,-269,5,2,6,-1,6,2,1,0,1,0,-2,871,871,862,890,910,914,939,946,991,789,825,844,15.797542027,14.630808905,13.626000742,14.205687636,14.863032276,12.594874051,14.226735104,12.576478586,12.813822694,12.499259523,11.328500533,10.10473133,10.55087217,11.739794688,12.910225115,11.384886151,12.831957152,11.896668933,12.871803792,14.809549197,4.4690414945,4.5260775749,3.0751285722,2.4658929481,1.9528071603,1.2099879001,1.3947779514,0.6798096533,-0.057981098,-2.310289675,-0.051965599,0,0,0,0,0,0,0,0,0,-21.40982669,-13.26245987,-9.384444091,-18.49419711,-9.981014375,-21.06478935,-10.09819237,-22.71697258,-24.41004233,-15.93507494,-21.46179229,-13.26245987,-9.384444091,-18.49419711,-9.981014375,-21.06478935,-10.09819237,-22.71697258,-24.41004233,-15.93507494 +050,3,6,28,053,Mississippi,Humphreys County,9375,9373,9333,9316,9213,8965,8794,8707,8569,8327,8212,8056,7827,-40,-17,-103,-248,-171,-87,-138,-242,-115,-156,-229,36,139,136,141,110,116,81,121,101,98,92,14,93,79,115,100,98,86,102,122,76,126,22,46,57,26,10,18,-5,19,-21,22,-34,0,2,4,5,10,7,4,1,-1,-2,-2,-67,-66,-165,-289,-196,-113,-138,-262,-93,-177,-193,-67,-64,-161,-284,-186,-106,-134,-261,-94,-179,-195,5,1,1,10,5,1,1,0,0,1,0,83,83,82,83,83,83,83,83,82,83,83,83,14.906965521,14.679691295,15.513257784,12.388084915,13.256385349,9.3771706414,14.322916667,12.213555838,12.048192771,11.584713215,9.9737251327,8.5271736197,12.652657058,11.261895377,11.199360037,9.9560083353,12.073863636,14.753008042,9.3434964347,15.866020273,4.9332403882,6.152517675,2.8606007262,1.1261895377,2.0570253128,-0.578837694,2.2490530303,-2.539452204,2.7046963364,-4.281307058,0.2144887125,0.4317556263,0.5501155243,1.1261895377,0.7999542883,0.4630701551,0.1183712121,-0.120926295,-0.245881485,-0.251841592,-7.078127514,-17.80991959,-31.7966773,-22.07331494,-12.9135478,-15.97592035,-31.01325758,-11.24614547,-21.76051143,-24.30271359,-6.863638801,-17.37816396,-31.24656178,-20.9471254,-12.11359351,-15.5128502,-30.89488636,-11.36707177,-22.00639292,-24.55455518 +050,3,6,28,055,Mississippi,Issaquena County,1406,1399,1386,1387,1395,1405,1386,1337,1321,1339,1302,1324,1220,-13,1,8,10,-19,-49,-16,18,-37,22,-104,6,13,12,17,8,12,9,15,14,7,10,10,9,10,12,18,12,7,9,15,13,16,-4,4,2,5,-10,0,2,6,-1,-6,-6,0,0,0,0,0,0,0,0,0,0,0,-10,-3,4,5,-7,-51,-18,12,-36,28,-97,-10,-3,4,5,-7,-51,-18,12,-36,28,-97,1,0,2,0,-2,2,0,0,0,0,-1,251,251,251,304,303,305,283,290,295,294,338,280,9.3761269383,8.6268871316,12.142857143,5.7327122895,8.8138082997,6.7720090293,11.278195489,10.60204468,5.331302361,7.8616352201,6.4911648035,7.1890726096,8.5714285714,12.898602651,8.8138082997,5.2671181339,6.7669172932,11.359333586,9.900990099,12.578616352,2.8849621349,1.4378145219,3.5714285714,-7.165890362,0,1.5048908954,4.5112781955,-0.757288906,-4.569687738,-4.716981132,0,0,0,0,0,0,0,0,0,0,-2.163721601,2.8756290439,3.5714285714,-5.016123253,-37.45868527,-13.54401806,9.022556391,-27.26240061,21.325209444,-76.25786164,-2.163721601,2.8756290439,3.5714285714,-5.016123253,-37.45868527,-13.54401806,9.022556391,-27.26240061,21.325209444,-76.25786164 +050,3,6,28,057,Mississippi,Itawamba County,23401,23399,23418,23271,23301,23378,23401,23546,23426,23508,23434,23351,23261,19,-147,30,77,23,145,-120,82,-74,-83,-90,61,250,311,250,264,253,268,259,260,265,261,56,283,237,270,268,289,297,303,299,279,299,5,-33,74,-20,-4,-36,-29,-44,-39,-14,-38,0,-2,0,8,10,14,4,2,4,4,2,16,-112,-39,92,18,170,-97,126,-39,-73,-56,16,-114,-39,100,28,184,-93,128,-35,-69,-54,-2,0,-5,-3,-1,-3,2,-2,0,0,2,934,934,928,919,949,993,1013,1010,1033,1002,997,884,10.709160616,13.355664348,10.71145483,11.287116014,10.778111487,11.411053394,11.036775046,11.077499893,11.328417228,11.198832919,12.122769817,10.17778923,11.568371216,11.458132923,12.31175581,12.645831559,12.911748413,12.739124878,11.926899647,12.82931434,-1.413609201,3.1778751181,-0.856916386,-0.171016909,-1.533644322,-1.234778166,-1.874973367,-1.661624984,-0.59848242,-1.630481421,-0.085673285,0,0.3427665546,0.4275422732,0.5964172365,0.1703142298,0.0852260621,0.1704230753,0.170994977,0.0858148116,-4.797703956,-1.674826076,3.9418153774,0.7695760918,7.2422092998,-4.130120072,5.3692419142,-1.661624984,-3.120658331,-2.402814726,-4.883377241,-1.674826076,4.2845819319,1.1971183651,7.8386265363,-3.959805842,5.4544679763,-1.491201909,-2.949663354,-2.316999914 +050,3,6,28,059,Mississippi,Jackson County,139668,139669,139479,140058,140000,140393,141511,141443,141680,142355,143137,143387,143802,-190,579,-58,393,1118,-68,237,675,782,250,415,392,1664,1621,1534,1630,1648,1701,1647,1610,1581,1562,350,1260,1262,1315,1222,1415,1330,1385,1380,1484,1584,42,404,359,219,408,233,371,262,230,97,-22,72,281,306,240,303,388,225,316,440,30,118,-311,-103,-729,-44,431,-684,-355,105,116,122,312,-239,178,-423,196,734,-296,-130,421,556,152,430,7,-3,6,-22,-24,-5,-4,-8,-4,1,7,1290,1290,1450,1329,1331,1287,1252,1343,1417,1422,1332,1336,11.905400716,11.576173507,10.94178528,11.564220444,11.648536511,12.015978921,11.597162322,11.278774887,11.035724756,10.877853957,9.0149067923,9.0124188561,9.3796920751,8.669618026,10.001625706,9.3952098558,9.7523192564,9.6675213316,10.358643604,11.031063167,2.8904939239,2.5637546508,1.5620932049,2.8946024178,1.6469108053,2.620769065,1.8448430651,1.6112535553,0.677081152,-0.153209211,2.0104673084,2.1852616244,1.7118829643,2.1496679721,2.7424952466,1.5894152012,2.2250778953,3.0823981057,0.2094065419,0.8217584935,-0.736932857,-5.206064458,-0.31384521,3.0577785345,-4.834708115,-2.507743984,0.7393455032,0.8126322279,0.8515866036,2.1727851693,1.2735344516,-3.020802834,1.3980377542,5.2074465066,-2.092212869,-0.918328783,2.9644233985,3.8950303336,1.0609931454,2.9945436629 +050,3,6,28,061,Mississippi,Jasper County,17062,17067,17013,16857,16558,16490,16531,16549,16587,16570,16411,16368,16332,-54,-156,-299,-68,41,18,38,-17,-159,-43,-36,56,216,232,253,207,223,219,206,189,184,195,22,186,216,208,198,211,191,198,200,186,212,34,30,16,45,9,12,28,8,-11,-2,-17,0,-1,-1,0,-2,-1,-1,0,0,0,0,-91,-187,-324,-111,36,9,14,-23,-148,-41,-20,-91,-188,-325,-111,34,8,13,-23,-148,-41,-20,3,2,10,-2,-2,-2,-3,-2,0,0,1,87,87,87,87,87,87,87,87,87,87,87,87,12.754650133,13.885979351,15.311062697,12.537476152,13.482466747,13.218252052,12.425732123,11.461144295,11.226700021,11.926605505,10.983170948,12.928325602,12.58775115,11.992368493,12.756952842,11.528247224,11.943179419,12.128195021,11.348729369,12.966360856,1.7714791851,0.9576537483,2.7233115468,0.5451076588,0.7255139057,1.6900048286,0.4825527038,-0.667050726,-0.122029348,-1.039755352,-0.059049306,-0.059853359,0,-0.121135035,-0.060459492,-0.060357315,0,0,0,0,-11.04222025,-19.3924884,-6.717501816,2.1804306351,0.5441354293,0.8450024143,-1.387339023,-8.974864316,-2.501601635,-1.22324159,-11.10126956,-19.45234176,-6.717501816,2.0592955998,0.4836759371,0.784645099,-1.387339023,-8.974864316,-2.501601635,-1.22324159 +050,3,6,28,063,Mississippi,Jefferson County,7726,7734,7723,7599,7683,7658,7584,7507,7302,7231,7092,7022,6997,-11,-124,84,-25,-74,-77,-205,-71,-139,-70,-25,21,111,116,127,103,116,89,113,76,84,81,5,93,67,82,80,102,89,105,89,69,78,16,18,49,45,23,14,0,8,-13,15,3,0,0,0,0,0,0,0,1,1,0,0,-30,-143,35,-73,-98,-93,-206,-81,-126,-85,-29,-30,-143,35,-73,-98,-93,-206,-80,-125,-85,-29,3,1,0,3,1,2,1,1,-1,0,1,393,393,386,428,405,410,384,372,360,355,357,365,14.488970108,15.181258998,16.556938922,13.515286708,15.373401365,12.019717739,15.550815386,10.612301892,11.903074961,11.555745774,12.139407388,8.7684858003,10.69030702,10.497310064,13.517990855,12.019717739,14.449872704,12.427564058,9.7775258608,11.127755189,2.3495627203,6.4127731972,5.8666319014,3.0179766435,1.8554105096,0,1.1009426822,-1.815262166,2.1255491002,0.4279905842,0,0,0,0,0,0,0.1376178353,0.1396355512,0,0,-18.6659705,4.5805522837,-9.51698064,-12.85920483,-12.32522696,-27.82091971,-11.14704466,-17.59407945,-12.04477823,-4.137242314,-18.6659705,4.5805522837,-9.51698064,-12.85920483,-12.32522696,-27.82091971,-11.00942682,-17.4544439,-12.04477823,-4.137242314 +050,3,6,28,065,Mississippi,Jefferson Davis County,12487,12475,12466,12163,12065,11945,11815,11633,11455,11285,11189,11089,10890,-9,-303,-98,-120,-130,-182,-178,-170,-96,-100,-199,35,146,144,164,137,111,149,111,133,120,116,13,156,160,159,156,160,161,163,168,154,165,22,-10,-16,5,-19,-49,-12,-52,-35,-34,-49,0,0,0,0,0,0,0,0,0,0,0,-31,-296,-79,-124,-112,-134,-167,-118,-60,-64,-148,-31,-296,-79,-124,-112,-134,-167,-118,-60,-64,-148,0,3,-3,-1,1,1,1,0,-1,-2,-2,116,116,116,112,111,114,112,113,114,111,110,110,11.855942182,11.887072808,13.660974594,11.531986532,9.4677584442,12.907137907,9.7625329815,11.835899261,10.772959871,10.555530279,12.667993016,13.207858676,13.244481466,13.131313131,13.647219379,13.946638947,14.335971856,14.950609593,13.825298501,15.014331862,-0.812050834,-1.320785868,0.4164931279,-1.599326599,-4.179460935,-1.03950104,-4.573438874,-3.114710332,-3.05233863,-4.458801583,0,0,0,0,0,0,0,0,0,0,-24.0367047,-6.521380221,-10.32902957,-9.427609428,-11.42954623,-14.46638947,-10.37818821,-5.339503426,-5.745578598,-13.4674007,-24.0367047,-6.521380221,-10.32902957,-9.427609428,-11.42954623,-14.46638947,-10.37818821,-5.339503426,-5.745578598,-13.4674007 +050,3,6,28,067,Mississippi,Jones County,67761,67778,67819,67945,68442,68982,68428,68664,68517,68422,68320,68282,67993,41,126,497,540,-554,236,-147,-95,-102,-38,-289,216,996,952,1016,951,1018,985,876,944,919,916,195,668,676,714,729,851,740,760,818,791,859,21,328,276,302,222,167,245,116,126,128,57,0,5,-1,4,12,35,15,87,23,-20,-11,27,-204,228,241,-795,41,-405,-294,-252,-147,-335,27,-199,227,245,-783,76,-390,-207,-229,-167,-346,-7,-3,-6,-7,7,-7,-2,-4,1,1,0,1810,1819,1858,1830,1947,1955,2096,2094,2235,1890,1920,1921,14.672519961,13.960274806,14.78635464,13.841787352,14.851340706,14.360589294,12.794017774,13.807023446,13.45514707,13.44340488,9.840605757,9.9129682448,10.391198044,10.610581472,12.41502057,10.788666069,11.099832772,11.964136842,11.581089589,12.606861126,4.8319142041,4.0473065615,4.3951565956,3.2312058802,2.4363201354,3.5719232255,1.6941850021,1.842886604,1.8740574809,0.8365437534,0.0736572287,-0.014664154,0.0582139946,0.1746597773,0.5106060164,0.2186891771,1.2706387516,0.3363999356,-0.292821481,-0.161438268,-3.005214932,3.3434271595,3.5073931773,-11.57121025,0.5981384764,-5.904607781,-4.293882678,-3.685773208,-2.152237888,-4.916529077,-2.931557703,3.3287630053,3.565607172,-11.39655047,1.1087444927,-5.685918604,-3.023243926,-3.349373272,-2.44505937,-5.077967345 +050,3,6,28,069,Mississippi,Kemper County,10456,10438,10454,10292,10392,10295,10222,10108,10041,10089,9714,9780,9521,16,-162,100,-97,-73,-114,-67,48,-375,66,-259,20,94,88,84,86,85,89,97,84,90,85,9,105,103,95,105,102,104,118,110,80,111,11,-11,-15,-11,-19,-17,-15,-21,-26,10,-26,0,-2,-1,0,0,0,0,0,0,0,0,3,-150,112,-88,-51,-95,-51,67,-351,56,-231,3,-152,111,-88,-51,-95,-51,67,-351,56,-231,2,1,4,2,-3,-2,-1,2,2,0,-2,708,751,832,925,923,966,1076,1080,1202,913,1062,832,9.0619878531,8.5089924579,8.1210422004,8.3832919043,8.3620265617,8.8341853194,9.6373571783,8.4835630965,9.2336103416,8.807833791,10.12243324,9.9593888996,9.1845120124,10.235414534,10.034431874,10.323092957,11.72379533,11.109427864,8.207653637,11.501994715,-1.060445387,-1.450396442,-1.063469812,-1.85212263,-1.672405312,-1.488907638,-2.086438152,-2.625864768,1.0259567046,-2.694160924,-0.192808252,-0.096693096,0,0,0,0,0,0,0,0,-14.46061891,10.829626765,-8.507758496,-4.97148706,-9.345794393,-5.06228597,6.6567312469,-35.44917437,5.7453575459,-23.9365836,-14.65342717,10.732933669,-8.507758496,-4.97148706,-9.345794393,-5.06228597,6.6567312469,-35.44917437,5.7453575459,-23.9365836 +050,3,6,28,071,Mississippi,Lafayette County,47351,47361,47574,48428,50266,51624,52116,52841,53614,54318,53717,54239,54408,213,854,1838,1358,492,725,773,704,-601,522,169,147,508,580,543,526,572,580,554,522,523,520,60,336,386,419,364,387,380,385,392,371,428,87,172,194,124,162,185,200,169,130,152,92,24,122,29,54,90,91,9,35,45,26,26,95,556,1539,1137,245,445,560,497,-784,344,44,119,678,1568,1191,335,536,569,532,-739,370,70,7,4,76,43,-5,4,4,3,8,0,7,5038,5039,4941,5842,6536,6252,6103,6112,5965,4817,4623,4349,10.583112852,11.753500719,10.658553342,10.140736457,10.899701783,10.896622986,10.265722863,9.6635349655,9.6891326096,9.5722845546,6.9998541697,7.8221573753,8.2245558936,7.0175438596,7.3744485837,7.1391667841,7.1341214839,7.2569074837,6.873170551,7.878726518,3.5832586821,3.9313433441,2.4339974482,3.1231925969,3.5252531989,3.7574562022,3.1316013786,2.4066274818,2.8159620586,1.6935580366,2.5416137164,0.587675036,1.0599666307,1.7351069983,1.7340434654,0.1690855291,0.6485564985,0.8330633591,0.4816777206,0.4786142277,11.583092019,31.187306219,22.318186279,4.7233468286,8.4796631001,10.520877366,9.2095022792,-14.51381497,6.3729667642,0.8099625392,14.124705735,31.774981255,23.37815291,6.4584538269,10.213706566,10.689962895,9.8580587777,-13.68075161,6.8546444848,1.288576767 +050,3,6,28,073,Mississippi,Lamar County,55658,55732,56109,57390,58167,59209,60211,61034,61461,61649,62744,63447,64165,377,1281,777,1042,1002,823,427,188,1095,703,718,171,774,813,765,763,797,817,816,788,758,750,117,386,401,395,394,430,457,455,444,401,457,54,388,412,370,369,367,360,361,344,357,293,5,9,8,14,27,38,7,36,67,22,27,299,879,353,646,598,419,64,-210,684,323,398,304,888,361,660,625,457,71,-174,751,345,425,19,5,4,12,8,-1,-4,1,0,1,0,338,338,335,311,318,319,319,319,326,354,395,395,13.638886686,14.070977959,13.035032715,12.778429074,13.146933894,13.339319972,13.256437332,12.669523205,12.013535038,11.754380466,6.8018220425,6.9402978617,6.7305070883,6.5985597052,7.0930760031,7.461529042,7.3917634636,7.138665359,6.355445317,7.1623358305,6.8370646437,7.1306800973,6.304525627,6.1798693686,6.053857891,5.8777909302,5.8646738689,5.5308578457,5.6580897211,4.5920446353,0.1585917057,0.1384598077,0.2385496183,0.4521855636,0.6268299724,0.1142903792,0.5848428235,1.0772310339,0.3486777979,0.4231576968,15.489123252,6.1095390154,11.00736096,10.015072852,6.9116252217,1.0449406098,-3.411583137,10.997403391,5.1192240334,6.2376579005,15.647714958,6.2479988231,11.245910578,10.467258416,7.538455194,1.159230989,-2.826740314,12.074634425,5.4679018314,6.6608155973 +050,3,6,28,075,Mississippi,Lauderdale County,80261,80280,80395,80663,80280,80276,79330,78422,77497,76416,75503,74619,73751,115,268,-383,-4,-946,-908,-925,-1081,-913,-884,-868,257,1041,1043,1059,1039,1053,1026,901,1011,882,880,178,863,827,913,887,900,833,856,882,875,906,79,178,216,146,152,153,193,45,129,7,-26,38,73,113,56,41,69,13,3,-10,0,7,2,21,-720,-195,-1168,-1140,-1134,-1131,-1034,-891,-846,40,94,-607,-139,-1127,-1071,-1121,-1128,-1044,-891,-839,-4,-4,8,-11,29,10,3,2,2,0,-3,3847,3933,3974,3996,3867,3711,3732,3605,3679,3684,3714,3727,12.92702008,12.961110455,13.191658985,13.019560668,13.350068462,13.160679584,11.707912912,13.309724261,11.750442973,11.862236301,10.716636243,10.276930342,11.372978898,11.114870368,11.410314925,10.685035179,11.123166984,11.611450839,11.657185489,12.212711465,2.2103838369,2.6841801135,1.8186800867,1.9046902999,1.9397535372,2.4756444051,0.5847459279,1.698273422,0.0932574839,-0.350475163,0.9065057309,1.4042238557,0.6975759237,0.5137651467,0.8747908109,0.1667532501,0.0389830619,-0.131649102,0,0.0943586978,0.2607756212,-8.947267045,-2.42905902,-14.63604125,-14.45306557,-14.54601428,-14.69661432,-13.6125172,-11.87034545,-11.40392263,1.1672813521,-7.543043189,-1.731483096,-14.1222761,-13.57827476,-14.37926103,-14.65763126,-13.7441663,-11.87034545,-11.30956393 +050,3,6,28,077,Mississippi,Lawrence County,12929,12951,12928,12748,12690,12599,12625,12694,12813,12633,12441,12607,12480,-23,-180,-58,-91,26,69,119,-180,-192,166,-127,43,173,162,133,176,157,162,165,158,147,139,19,139,152,162,135,144,148,168,183,144,159,24,34,10,-29,41,13,14,-3,-25,3,-20,0,0,0,0,0,0,0,1,1,1,1,-50,-215,-67,-62,-15,59,104,-178,-169,163,-106,-50,-215,-67,-62,-15,59,104,-177,-168,164,-105,3,1,-1,0,0,-3,1,0,1,-1,-2,0,0,0,0,0,0,0,0,0,0,0,0,13.475619255,12.736850381,10.518407213,13.954963527,12.401753624,12.702395421,12.968639472,12.60269602,11.737464069,11.081436601,10.827231656,11.950625049,12.8118945,10.704091342,11.374856827,11.604657545,13.204432917,14.596793491,11.497923986,12.67588791,2.6483875993,0.7862253322,-2.293487287,3.2508721852,1.0268967969,1.0977378759,-0.235793445,-1.994097471,0.239540083,-1.594451309,0,0,0,0,0,0,0.078597815,0.0797638989,0.0798466943,0.0797225655,-16.74715688,-5.267709726,-4.903317648,-1.189343482,4.6605316166,8.1546242208,-13.99041107,-13.48009891,13.015011179,-8.45059194,-16.74715688,-5.267709726,-4.903317648,-1.189343482,4.6605316166,8.1546242208,-13.91181325,-13.40033501,13.094857873,-8.370869375 +050,3,6,28,079,Mississippi,Leake County,23805,23795,23730,23251,23189,23261,23176,22774,22780,22822,22781,22830,22741,-65,-479,-62,72,-85,-402,6,42,-41,49,-89,62,330,295,297,309,317,289,298,324,308,320,88,249,231,233,263,221,249,241,265,212,290,-26,81,64,64,46,96,40,57,59,96,30,-2,-8,-7,-4,-3,0,2,-4,-4,-5,-2,-39,-556,-116,9,-123,-500,-35,-10,-95,-42,-118,-41,-564,-123,5,-126,-500,-33,-14,-99,-47,-120,2,4,-3,3,-5,2,-1,-1,-1,0,1,1845,1845,1658,1746,1981,1925,1605,1639,1684,1670,1679,1688,14.048232264,12.70456503,12.787944026,13.308353253,13.797606094,12.688238135,13.06960221,14.209591474,13.505514021,14.044019223,10.600029799,9.9483204134,10.032292788,11.327174451,9.6191512514,10.932080608,10.569711855,11.622042409,9.2960031571,12.727392421,3.4482024648,2.7562446167,2.7556512379,1.9811788014,4.1784548422,1.7561575273,2.4998903557,2.5875490648,4.2095108636,1.3166268021,-0.340563206,-0.301464255,-0.172228202,-0.129207313,0,0.0878078764,-0.175430902,-0.175427055,-0.219245357,-0.08777512,-23.66914284,-4.995693368,0.3875134553,-5.297499838,-21.76278564,-1.536637836,-0.438577255,-4.166392562,-1.841661003,-5.178732088,-24.00970605,-5.297157623,0.215285253,-5.426707152,-21.76278564,-1.44882996,-0.614008158,-4.341819617,-2.06090636,-5.266507209 +050,3,6,28,081,Mississippi,Lee County,82910,82906,82877,84032,84802,84981,84781,84762,84859,85124,85396,85674,85466,-29,1155,770,179,-200,-19,97,265,272,278,-208,275,1178,1196,1133,1167,1181,1168,1193,1143,1089,1076,257,850,843,914,890,963,889,935,959,880,1050,18,328,353,219,277,218,279,258,184,209,26,6,23,14,13,16,20,0,59,114,95,77,-46,803,405,-37,-490,-247,-177,-49,-25,-28,-315,-40,826,419,-24,-474,-227,-177,10,89,67,-238,-7,1,-2,-16,-3,-10,-5,-3,-1,2,4,1065,1065,1064,1063,1060,1062,1062,1063,1063,1063,1060,1060,14.115476098,14.167762418,13.346448113,13.748659889,13.931568983,13.771879661,14.036697787,13.406052076,12.731630327,12.574500409,10.185190733,9.9861402324,10.766684533,10.48526761,11.359949983,10.482192653,11.00110011,11.247947455,10.288186123,12.270655604,3.9302853651,4.1816221851,2.5797635806,3.2633922786,2.5716189993,3.2896870081,3.0355976774,2.1581046212,2.4434442041,0.3038448054,0.2755992786,0.1658433728,0.1531366509,0.188499193,0.2359283486,0,0.6941870658,1.3370865588,1.1106564564,0.8998480776,9.622009598,4.7976118554,-0.435850468,-5.772787785,-2.913715105,-2.087005736,-0.576528241,-0.293220737,-0.327351377,-3.681196681,9.8976088767,4.9634552282,-0.282713817,-5.584288592,-2.677786756,-2.087005736,0.1176588247,1.0438658222,0.7833050798,-2.781348603 +050,3,6,28,083,Mississippi,Leflore County,32317,32382,32420,32073,30806,30759,30721,30260,29797,29317,28651,28202,27854,38,-347,-1267,-47,-38,-461,-463,-480,-666,-449,-348,141,554,469,456,441,538,480,455,439,408,389,47,350,391,365,365,383,373,373,382,377,365,94,204,78,91,76,155,107,82,57,31,24,11,63,15,10,9,-1,-5,-1,2,2,2,-68,-617,-1429,-146,-120,-621,-566,-562,-730,-482,-373,-57,-554,-1414,-136,-111,-622,-571,-563,-728,-480,-371,1,3,69,-2,-3,6,1,1,5,0,-1,2344,2344,2350,1231,1248,1447,1457,1456,1494,1263,1209,1264,17.180159087,14.917540037,14.81361163,14.346128822,17.644840196,15.984814426,15.393984505,15.146287607,14.352804601,13.878978165,10.85389112,12.436584551,11.857386502,11.873780091,12.561289582,12.421532877,12.619684,13.179685344,13.262272879,13.022691594,6.3262679671,2.4809554859,2.9562251279,2.4723487313,5.0835506141,3.5632815492,2.7743005041,1.9666022633,1.0905317222,0.8562865706,1.9537004016,0.4771068242,0.3248599042,0.2927781392,-0.032797101,-0.166508484,-0.033832933,0.0690035882,0.0703568853,0.0713572142,-19.13385949,-45.45237679,-4.742954601,-3.903708523,-20.36699956,-18.84876034,-19.01410833,-25.18630969,-16.95600936,-13.30812045,-17.18015909,-44.97526996,-4.418094697,-3.610930384,-20.39979666,-19.01526883,-19.04794127,-25.1173061,-16.88565247,-13.23676324 +050,3,6,28,085,Mississippi,Lincoln County,34869,34867,34896,34870,34848,34728,34737,34527,34385,34352,34202,34111,33936,29,-26,-22,-120,9,-210,-142,-33,-150,-91,-175,104,435,488,472,469,427,417,423,416,402,393,66,404,395,417,419,440,419,417,430,422,440,38,31,93,55,50,-13,-2,6,-14,-20,-47,5,16,5,7,7,7,7,27,6,-2,-2,-13,-73,-115,-181,-41,-203,-145,-66,-140,-70,-126,-8,-57,-110,-174,-34,-196,-138,-39,-134,-72,-128,-1,0,-5,-1,-7,-1,-2,0,-2,1,0,714,714,710,705,699,705,705,705,710,689,652,648,12.470257719,13.999254138,13.567896976,13.503203052,12.32963733,12.102391456,12.307781835,12.136418006,11.76935576,11.550839861,11.581572686,11.331363493,11.986892032,12.063629166,12.705012705,12.160436499,12.133203369,12.544855151,12.354895847,12.932238012,0.8886850328,2.6678906452,1.5810049442,1.4395738861,-0.375375375,-0.058045043,0.1745784657,-0.408437144,-0.585540088,-1.381398151,0.458676146,0.1434349809,0.2012188111,0.2015403441,0.2021252021,0.2031576503,0.7856030959,0.1750444905,-0.058554009,-0.0587829,-2.092709916,-3.299004561,-5.202943544,-1.180450587,-5.861630862,-4.208265614,-1.920363123,-4.084371444,-2.049390306,-3.703322703,-1.63403377,-3.15556958,-5.001724733,-0.978910243,-5.65950566,-4.005107964,-1.134760027,-3.909326954,-2.107944315,-3.762105603 +050,3,6,28,087,Mississippi,Lowndes County,59779,59779,59796,59626,59619,59826,59828,59725,59552,59173,58826,58621,58309,17,-170,-7,207,2,-103,-173,-379,-347,-205,-312,176,789,802,795,806,792,788,807,815,775,794,138,591,559,567,590,607,616,675,656,646,678,38,198,243,228,216,185,172,132,159,129,116,32,56,149,139,129,190,49,44,57,63,45,-50,-425,-400,-150,-339,-478,-392,-557,-565,-397,-473,-18,-369,-251,-11,-210,-288,-343,-513,-508,-334,-428,-3,1,1,-10,-4,0,-2,2,2,0,0,1318,1318,1375,1334,1319,1416,1411,1431,1444,1285,1280,1232,13.213645727,13.451297748,13.311565993,13.472178114,13.249353843,13.212941305,13.594440935,13.813676387,13.197442251,13.580774823,9.8976737954,9.3756551637,9.4939093307,9.861768098,10.15449215,10.328898279,11.370814908,11.118738294,11.000706702,11.596681775,3.3159719315,4.0756425846,3.8176566621,3.6104100155,3.0948616931,2.8840430259,2.2236260265,2.6949380927,2.1967355488,1.9840930471,0.9378506473,2.4990565642,2.3274310352,2.1562170926,3.1785066038,0.8216169085,0.7412086755,0.9661098823,1.0728243378,0.7696912683,-7.11761652,-6.708876682,-2.511616225,-5.666337941,-7.996453456,-6.572935268,-9.383028006,-9.576352342,-6.760496224,-8.090310442,-6.179765872,-4.209820118,-0.18418519,-3.510120848,-4.817946852,-5.75131836,-8.64181933,-8.61024246,-5.687671886,-7.320619174 +050,3,6,28,089,Mississippi,Madison County,95203,95208,95546,96977,98092,99531,100902,102516,103921,104635,105651,106334,106871,338,1431,1115,1439,1371,1614,1405,714,1016,683,537,276,1246,1314,1240,1323,1345,1312,1276,1315,1359,1343,210,932,986,1021,959,1006,958,998,1076,1033,1174,66,314,328,219,364,339,354,278,239,326,169,58,243,142,129,148,201,46,87,102,66,56,200,871,649,1074,862,1067,1005,354,680,290,304,258,1114,791,1203,1010,1268,1051,441,782,356,360,14,3,-4,17,-3,7,0,-5,-5,1,8,1765,1765,1771,1781,1775,1774,1751,1755,1756,1764,1763,1771,12.943908001,13.472156006,12.549146607,13.201418928,13.224001809,12.710899693,12.236521606,12.506776485,12.82166191,12.598203607,9.6819600775,10.109243396,10.332805392,9.5692825034,9.8909634349,9.2812819407,9.5705709737,10.233681748,9.7459725924,11.012874933,3.2619479231,3.3629126104,2.2163412153,3.6321364246,3.3330383742,3.4296177526,2.665950632,2.2730947376,3.0756893176,1.5853286743,2.5243737112,1.4558950935,1.3055160584,1.4768027221,1.9762262927,0.4456565441,0.8343082913,0.9701073776,0.6226855674,0.5253160104,9.0482695574,6.6540557444,10.869180207,8.6013780166,10.490713703,9.7366266706,3.394771668,6.4673825171,2.7360426445,2.8517154851,11.572643269,8.1099508379,12.174696265,10.078180739,12.466939995,10.182283215,4.2290799593,7.4374898947,3.3587282119,3.3770314955 +050,3,6,28,091,Mississippi,Marion County,27088,27075,26987,26669,26333,26064,25685,25430,25120,25123,24736,24504,24441,-88,-318,-336,-269,-379,-255,-310,3,-387,-232,-63,70,367,337,317,320,303,301,311,290,298,292,127,344,338,372,308,343,367,317,292,331,373,-57,23,-1,-55,12,-40,-66,-6,-2,-33,-81,0,-4,-2,-3,0,11,5,9,3,-2,0,-30,-337,-338,-212,-398,-226,-249,1,-389,-196,18,-30,-341,-340,-215,-398,-215,-244,10,-386,-198,18,-1,0,5,1,7,0,0,-1,1,-1,0,693,693,692,729,729,730,720,723,728,721,721,808,13.679737588,12.716501264,12.099929385,12.367388742,11.855619681,11.909000989,12.379834007,11.632804509,12.103980504,11.931760139,12.822424333,12.754235689,14.199286219,11.903611664,13.420717989,14.520276954,12.618673248,11.713030747,13.444354184,15.241597712,0.8573132548,-0.037734425,-2.099356833,0.4637770778,-1.565098308,-2.611275964,-0.238839241,-0.080226238,-1.34037368,-3.309837573,-0.149097957,-0.07546885,-0.114510373,0,0.4304020346,0.1978239367,0.3582588619,0.120339357,-0.081234768,0,-12.56150291,-12.75423569,-8.09206634,-15.38193975,-8.842805439,-9.851632047,0.0398065402,-15.60400329,-7.961007311,0.7355194606,-12.71060086,-12.82970454,-8.206576712,-15.38193975,-8.412403404,-9.653808111,0.3980654021,-15.48366393,-8.04224208,0.7355194606 +050,3,6,28,093,Mississippi,Marshall County,37144,37159,37071,36771,36567,36478,36197,35918,35794,35622,35491,35302,35301,-88,-300,-204,-89,-281,-279,-124,-172,-131,-189,-1,102,461,466,449,455,438,392,384,448,386,406,138,371,418,405,427,430,380,412,415,438,486,-36,90,48,44,28,8,12,-28,33,-52,-80,2,-6,-2,1,2,5,-4,10,-2,-7,-4,-53,-385,-251,-131,-313,-292,-130,-151,-162,-129,82,-51,-391,-253,-130,-311,-287,-134,-141,-164,-136,78,-1,1,1,-3,2,0,-2,-3,0,-1,1,1737,1737,1840,1836,1845,1847,1849,1846,1842,1811,1811,1786,12.486119011,12.7082822,12.293791498,12.521499828,12.147264785,10.932619366,10.753892685,12.599665321,10.905032983,11.500927723,10.048481894,11.399274592,11.089054692,11.750945992,11.925396935,10.597947345,11.538030693,11.671564974,12.374104784,13.767120377,2.4376371171,1.3090076086,1.2047368061,0.7705538356,0.22186785,0.3346720214,-0.784138008,0.9281003473,-1.469071801,-2.266192655,-0.162509141,-0.054541984,0.027380382,0.0550395597,0.1386674062,-0.11155734,0.2800492887,-0.056248506,-0.197759666,-0.113309633,-10.42766989,-6.845018953,-3.586830036,-8.61369109,-8.098176524,-3.625613565,-4.228744259,-4.556128978,-3.644428121,2.3228474711,-10.59017903,-6.899560937,-3.559449654,-8.558651531,-7.959509117,-3.737170906,-3.94869497,-4.612377484,-3.842187787,2.2095378383 +050,3,6,28,095,Mississippi,Monroe County,36989,36971,36913,36601,36410,36154,36061,35831,35906,35863,35614,35291,35123,-58,-312,-191,-256,-93,-230,75,-43,-249,-323,-168,104,406,427,443,445,412,408,405,422,380,385,62,418,405,430,423,427,457,446,441,454,463,42,-12,22,13,22,-15,-49,-41,-19,-74,-78,0,-1,1,1,-2,-1,-1,-1,-2,-3,-2,-102,-300,-216,-269,-108,-214,129,-1,-228,-246,-89,-102,-301,-215,-268,-110,-215,128,-2,-230,-249,-91,2,1,2,-1,-5,0,-4,0,0,0,1,408,408,406,406,406,406,406,406,404,402,399,399,11.04551514,11.696867595,12.209911251,12.324309354,11.4616369,11.374883254,11.286209924,11.80799418,10.718567097,10.935325361,11.371983568,11.094218679,11.851606857,11.715017656,11.878929505,12.740984429,12.428764508,12.339633728,12.805867005,13.150793876,-0.326468428,0.6026489159,0.3583043934,0.6092916984,-0.417292606,-1.366101175,-1.142554585,-0.531639548,-2.087299908,-2.215468515,-0.027205702,0.0273931325,0.0275618764,-0.055390154,-0.027819507,-0.027879616,-0.027867185,-0.055962058,-0.084620267,-0.056806885,-8.161710695,-5.916916629,-7.414144755,-2.991068338,-5.953374506,3.5964704406,-0.027867185,-6.379674581,-6.938861857,-2.527906382,-8.188916397,-5.889523496,-7.386582879,-3.046458492,-5.981194013,3.5685908248,-0.05573437,-6.435636638,-7.023482124,-2.584713267 +050,3,6,28,097,Mississippi,Montgomery County,10925,10929,10894,10771,10600,10575,10358,10190,10230,10138,9986,9766,9661,-35,-123,-171,-25,-217,-168,40,-92,-152,-220,-105,35,115,126,147,120,124,134,130,152,107,117,65,144,164,149,143,152,132,133,148,136,145,-30,-29,-38,-2,-23,-28,2,-3,4,-29,-28,0,0,0,3,6,10,1,0,1,1,0,-4,-94,-136,-24,-204,-151,38,-90,-155,-192,-77,-4,-94,-136,-21,-198,-141,39,-90,-154,-191,-77,-1,0,3,-2,4,1,-1,1,-2,0,0,99,99,99,99,99,100,100,100,100,99,97,97,10.616201246,11.791680314,13.884297521,11.465150719,12.069301149,13.124387855,12.76512176,15.106340688,10.834345889,12.045091882,13.293330256,15.347901362,14.073199528,13.66263794,14.794627214,12.928501469,13.059701493,14.708805406,13.770757392,14.927677974,-2.67712901,-3.556221047,-0.188902007,-2.197487221,-2.725326066,0.1958863859,-0.294579733,0.3975352813,-2.936411503,-2.882586092,0,0,0.2833530106,0.5732575359,0.9733307378,0.0979431929,0,0.0993838203,0.1012555691,0,-8.677590584,-12.72752796,-2.266824085,-19.49075622,-14.69729414,3.721841332,-8.837391987,-15.40449215,-19.44106926,-7.927111752,-8.677590584,-12.72752796,-1.983471074,-18.91749869,-13.7239634,3.819784525,-8.837391987,-15.30510833,-19.33981369,-7.927111752 +050,3,6,28,099,Mississippi,Neshoba County,29676,29694,29696,29758,29747,29539,29470,29491,29474,29446,29188,29147,28996,2,62,-11,-208,-69,21,-17,-28,-258,-41,-151,111,428,442,416,416,445,423,464,428,439,433,63,313,327,380,394,380,414,395,393,395,405,48,115,115,36,22,65,9,69,35,44,28,0,0,-1,-3,-2,-2,-3,0,2,0,1,-45,-51,-128,-243,-84,-38,-22,-97,-295,-86,-180,-45,-51,-129,-246,-86,-40,-25,-97,-293,-86,-179,-1,-2,3,2,-5,-4,-1,0,0,1,0,386,386,388,393,394,392,392,392,390,383,366,367,14.397685606,14.855894463,14.033667308,14.099544137,15.094723631,14.347494276,15.750169722,14.599038101,15.050998543,14.894312299,10.529148585,10.990673053,12.819215329,13.353895169,12.889876359,14.042228441,13.408010862,13.405191527,13.542470215,13.931169702,3.8685370202,3.86522141,1.2144519785,0.7456489688,2.2048472719,0.3052658357,2.3421588595,1.1938465737,1.5085283278,0.9631425967,0,-0.033610621,-0.101204332,-0.06778627,-0.067841455,-0.101755279,0,0.0682198042,0,0.0343979499,-1.71561207,-4.302159482,-8.197550855,-2.847023335,-1.288987636,-0.746205376,-3.292600136,-10.06242112,-2.948487186,-6.191630979,-1.71561207,-4.335770103,-8.298755187,-2.914809605,-1.35682909,-0.847960655,-3.292600136,-9.994201317,-2.948487186,-6.157233029 +050,3,6,28,101,Mississippi,Newton County,21720,21717,21661,21424,21499,21525,21714,21578,21504,21402,21315,20987,20866,-56,-237,75,26,189,-136,-74,-102,-87,-328,-121,59,313,295,271,301,259,321,271,294,271,259,98,235,230,289,296,268,268,286,260,237,290,-39,78,65,-18,5,-9,53,-15,34,34,-31,5,19,15,1,3,3,0,-1,0,0,-1,-18,-336,0,45,178,-129,-126,-86,-121,-361,-89,-13,-317,15,46,181,-126,-126,-87,-121,-361,-90,-4,2,-5,-2,3,-1,-1,0,0,-1,0,600,600,521,537,552,643,643,643,737,623,511,553,14.529418591,13.745544347,12.597619933,13.922616157,11.96525917,14.901815143,12.632265884,13.765011588,12.812632972,12.376651614,10.90866891,10.716865084,13.434362216,13.691343463,12.381040377,12.441390836,13.331468792,12.173139499,11.205143965,13.858026904,3.6207496809,3.0286792629,-0.836742283,0.2312726936,-0.415781207,2.4604243071,-0.699202909,1.5918720884,1.6074890076,-1.48137529,0.8819774864,0.6989259837,0.0464856824,0.1387636162,0.1385937356,0,-0.046613527,0,0,-0.0477863,-15.59707555,0,2.0918557084,8.2333078933,-5.959530629,-5.849310617,-4.008763343,-5.665191844,-17.06775093,-4.25298067,-14.71509806,0.6989259837,2.1383413909,8.3720715095,-5.820936894,-5.849310617,-4.05537687,-5.665191844,-17.06775093,-4.30076697 +050,3,6,28,103,Mississippi,Noxubee County,11545,11546,11482,11295,11155,11059,11069,10948,10891,10717,10561,10425,10236,-64,-187,-140,-96,10,-121,-57,-174,-156,-136,-189,32,142,154,170,163,148,155,168,183,150,152,54,113,108,116,111,131,124,137,118,114,137,-22,29,46,54,52,17,31,31,65,36,15,0,0,6,14,16,18,0,0,4,3,1,-45,-216,-197,-167,-59,-156,-88,-205,-226,-174,-203,-45,-216,-191,-153,-43,-138,-88,-205,-222,-171,-202,3,0,5,3,1,0,0,0,1,-1,-2,173,173,173,172,172,173,159,159,157,157,157,157,12.468718444,13.719376392,15.305663095,14.732465654,13.444156788,14.194789139,15.549796372,17.200864743,14.295244449,14.713711824,9.9222900294,9.6213808463,10.44386423,10.032537961,11.899895535,11.355831311,12.680488708,11.091267976,10.864385781,13.261700789,2.5464284146,4.0979955457,4.8617988656,4.6999276934,1.5442612527,2.8389578277,2.8693076638,6.1095967666,3.4308586677,1.4520110353,0,0.5345211581,1.2604663726,1.446131598,1.6351001499,0,0,0.3759751856,0.285904889,0.0968007357,-18.9665013,-17.55011136,-15.03556316,-5.332610268,-14.17086797,-8.058977059,-18.97445391,-21.24259799,-16.58248356,-19.65054934,-18.9665013,-17.0155902,-13.77509679,-3.88647867,-12.53576782,-8.058977059,-18.97445391,-20.8666228,-16.29657867,-19.55374861 +050,3,6,28,105,Mississippi,Oktibbeha County,47671,47657,47725,47776,48853,49152,49124,49589,49612,49774,49248,49543,49789,68,51,1077,299,-28,465,23,162,-526,295,246,145,559,565,565,564,554,541,598,555,525,513,33,292,286,285,281,311,330,337,315,333,388,112,267,279,280,283,243,211,261,240,192,125,21,127,94,106,121,170,49,56,136,99,76,-62,-345,668,-79,-440,54,-237,-153,-909,4,42,-41,-218,762,27,-319,224,-188,-97,-773,103,118,-3,2,36,-8,8,-2,0,-2,7,0,3,4367,4368,4172,4644,4819,4693,4638,4639,4575,4108,4233,4722,11.7066837,11.694211883,11.530023978,11.477878628,11.224458785,10.907148113,12.033888073,11.209630183,10.628498547,10.328997705,6.1151192134,5.9195479618,5.8160297944,5.7185884651,6.3010950939,6.6531587383,6.7816392651,6.3622225364,6.7415047929,7.8121853985,5.5915644862,5.7746639208,5.713994184,5.7592901624,4.9233636907,4.2539893751,5.2522488077,4.8474076468,3.8869937545,2.5168123062,2.6596580141,1.9455856937,2.1631549411,2.4624526843,3.4443285079,0.9878932672,1.1269192844,2.7468643332,2.0042311547,1.5302218822,-7.225055235,13.826077058,-1.612162645,-8.954373397,1.0940808202,-4.778177639,-3.078904473,-18.35955646,0.0809790366,0.8456489349,-4.565397221,15.771662751,0.5509922963,-6.491920713,4.5384093281,-3.790284372,-1.951985189,-15.61269213,2.0852101912,2.3758708171 +050,3,6,28,107,Mississippi,Panola County,34707,34701,34643,34480,34427,34398,34453,34204,34238,34113,34092,34102,33848,-58,-163,-53,-29,55,-249,34,-125,-21,10,-254,118,508,517,497,540,477,493,531,488,484,485,132,382,389,349,412,411,386,426,379,406,456,-14,126,128,148,128,66,107,105,109,78,29,2,-3,-2,0,39,49,17,19,5,-2,-2,-43,-288,-177,-175,-106,-365,-88,-248,-134,-65,-280,-41,-291,-179,-175,-67,-316,-71,-229,-129,-67,-282,-3,2,-2,-2,-6,1,-2,-1,-1,-1,-1,315,315,315,314,315,315,315,315,315,316,316,316,14.698436121,15.005732364,14.442426444,15.686046681,13.895159998,14.406358669,15.537446416,14.309801334,14.194797196,14.275202355,11.05276102,11.290580057,10.14166364,11.967872653,11.972559244,11.279623623,12.465070006,11.113554725,11.907205913,13.421633554,3.6456751009,3.7151523067,4.3007628042,3.718174028,1.9226007545,3.1267350457,3.07237641,3.1962466095,2.2875912837,0.8535688006,-0.086801788,-0.058049255,0,1.1328811491,1.4273854086,0.4967709886,0.5559538266,0.1466168169,-0.058656187,-0.058866814,-8.332971659,-5.137359049,-5.085361424,-3.079112867,-10.63256478,-2.571520411,-7.256660473,-3.929330694,-1.90632607,-8.241353937,-8.419773447,-5.195408304,-5.085361424,-1.946231718,-9.20517937,-2.074749423,-6.700706647,-3.782713877,-1.964982257,-8.300220751 +050,3,6,28,109,Mississippi,Pearl River County,55834,55726,55683,55441,55003,54848,55149,54978,55110,55329,55492,55752,55876,-43,-242,-438,-155,301,-171,132,219,163,260,124,165,662,687,627,642,610,642,610,612,627,616,161,578,574,637,594,635,668,637,712,720,713,4,84,113,-10,48,-25,-26,-27,-100,-93,-97,2,8,2,-2,-22,-20,-15,-9,-18,-22,-13,-46,-333,-563,-133,275,-120,177,257,283,376,233,-44,-325,-561,-135,253,-140,162,248,265,354,220,-3,-1,10,-10,0,-6,-4,-2,-2,-1,1,1124,1124,1124,1128,1224,1328,1345,1341,1351,1340,1339,1236,11.914617904,12.440693926,11.415462763,11.673045629,11.078118899,11.663396555,11.046822228,11.044838072,11.272518068,11.036657469,10.402793276,10.394408026,11.59752756,10.800294553,11.532140165,12.135745949,11.535779933,12.849550176,12.944518356,12.774572688,1.5118246283,2.0462859005,-0.182064797,0.872751075,-0.454021266,-0.472349393,-0.488957705,-1.804712103,-1.672000288,-1.737915218,0.1439832979,0.0362174496,-0.036412959,-0.400010909,-0.363217013,-0.272509265,-0.162985902,-0.324848179,-0.39552695,-0.232916473,-5.993304777,-10.19521205,-2.421461798,5.0001363674,-2.179302079,3.2156093307,4.6541529713,5.1073352523,6.7599151415,4.1745798545,-5.849321479,-10.1589946,-2.457874758,4.600125458,-2.542519092,2.9431000654,4.4911670696,4.7824870737,6.3643881917,3.9416633819 +050,3,6,28,111,Mississippi,Perry County,12250,12252,12235,12155,12003,12020,12064,12083,12077,12031,11937,11998,11862,-17,-80,-152,17,44,19,-6,-46,-94,61,-136,35,147,166,156,146,127,137,131,134,136,140,55,133,107,142,151,136,147,123,134,123,136,-20,14,59,14,-5,-9,-10,8,0,13,4,0,0,0,0,0,-1,-1,-2,-2,-2,0,4,-95,-216,4,50,31,4,-51,-91,49,-139,4,-95,-216,4,50,30,3,-53,-93,47,-139,-1,1,5,-1,-1,-2,1,-1,-1,1,-1,102,102,102,101,101,102,102,102,102,102,102,102,12.054120541,13.742859508,12.987553594,12.124231855,10.51890504,11.341059603,10.867761739,11.181575434,11.364111134,11.735121542,10.906109061,8.8583492011,11.822003913,12.539445275,11.264339255,12.168874172,10.204081633,11.181575434,10.277835805,11.399832355,1.1480114801,4.8845103071,1.1655496816,-0.41521342,-0.745434215,-0.82781457,0.6636801062,0,1.086275329,0.3352891869,0,0,0,0,-0.082826024,-0.082781457,-0.165920027,-0.166889186,-0.167119281,0,-7.790077901,-17.88227502,0.3330141947,4.152134197,2.567606742,0.3311258278,-4.230960677,-7.593457944,4.094422394,-11.65129925,-7.790077901,-17.88227502,0.3330141947,4.152134197,2.4847807181,0.2483443709,-4.396880704,-7.76034713,3.9273031126,-11.65129925 +050,3,6,28,113,Mississippi,Pike County,40404,40402,40442,40436,40091,39944,39960,39907,39637,39535,39371,39284,38997,40,-6,-345,-147,16,-53,-270,-102,-164,-87,-287,144,595,586,532,565,503,553,550,536,537,521,83,505,489,461,502,519,544,514,565,506,553,61,90,97,71,63,-16,9,36,-29,31,-32,3,5,-1,7,27,8,3,-2,1,-1,-1,-21,-99,-452,-223,-70,-41,-280,-133,-136,-116,-255,-18,-94,-453,-216,-43,-33,-277,-135,-135,-117,-256,-3,-2,11,-2,-4,-4,-2,-3,0,-1,1,865,865,876,875,884,848,874,873,901,859,867,945,14.713519128,14.554124704,13.294183795,14.141970364,12.595940751,13.904254249,13.893800839,13.585785618,13.654567415,13.311020554,12.487944806,12.144994846,11.519960017,12.565078094,12.996606859,13.677964397,12.98438842,14.320837452,12.86631492,14.128588035,2.2255743218,2.4091298571,1.7742237771,1.5768922707,-0.400666107,0.2262898522,0.9094124185,-0.735051834,0.7882524951,-0.817567481,0.1236430179,-0.02483639,0.174923471,0.6758109732,0.2003330537,0.0754299507,-0.050522912,0.025346615,-0.0254275,-0.025548984,-2.448131754,-11.22604841,-5.572562004,-1.752102523,-1.0267069,-7.040128734,-3.359773657,-3.447139635,-2.949589982,-6.514990866,-2.324488736,-11.2508848,-5.397638533,-1.07629155,-0.826373847,-6.964698783,-3.410296569,-3.42179302,-2.975017481,-6.54053985 +050,3,6,28,115,Mississippi,Pontotoc County,29957,29954,30055,29782,30306,30680,30802,30884,31516,31776,31947,32280,32461,101,-273,524,374,122,82,632,260,171,333,181,127,401,431,421,453,447,452,452,412,461,449,95,276,251,295,321,285,281,330,320,281,290,32,125,180,126,132,162,171,122,92,180,159,2,3,-6,-12,2,20,21,115,42,4,3,67,-404,344,259,-8,-99,439,26,37,148,19,69,-401,338,247,-6,-79,460,141,79,152,22,0,3,6,1,-4,-1,1,-3,0,1,0,236,236,235,237,236,235,235,235,234,234,233,233,13.403078363,14.345626415,13.806447381,14.736020299,14.492753623,14.487179487,14.283005751,12.930966841,14.355333427,13.870653836,9.2250614168,8.3544135268,9.6743514905,10.442080609,9.2403462698,9.0064102564,10.427858181,10.043469391,8.7502140844,8.9587741926,4.178016946,5.9912128878,4.1320958909,4.2939396897,5.2524073534,5.4807692308,3.85514757,2.8874974499,5.6051193423,4.9118796435,0.1002724067,-0.199707096,-0.393532942,0.0650596923,0.6484453523,0.6730769231,3.6339505783,1.3182053576,0.1245582076,0.0926769744,-13.50335077,11.449873519,8.4937526645,-0.260238769,-3.209804494,14.070512821,0.8215888264,1.1612761483,4.6086536815,0.5869541712,-13.40307836,11.250166423,8.1002197226,-0.195179077,-2.561359141,14.743589744,4.4555394047,2.4794815059,4.7332118891,0.6796311456 +050,3,6,28,117,Mississippi,Prentiss County,25276,25281,25232,25368,25366,25480,25421,25457,25404,25224,25062,25074,25013,-49,136,-2,114,-59,36,-53,-180,-162,12,-61,84,354,353,316,288,308,302,300,321,282,283,52,314,235,322,274,315,303,318,339,298,284,32,40,118,-6,14,-7,-1,-18,-18,-16,-1,0,3,-4,0,2,3,5,5,9,0,3,-84,93,-119,121,-70,42,-56,-166,-153,28,-63,-84,96,-123,121,-68,45,-51,-161,-144,28,-60,3,0,3,-1,-5,-2,-1,-1,0,0,0,864,864,901,812,873,877,901,901,928,731,750,722,13.992094862,13.91571727,12.429689651,11.316084163,12.107394159,11.875503824,11.851149562,12.766972915,11.249401628,11.300337413,12.411067194,9.2640044152,12.665696417,10.765996739,12.382562208,11.914826684,12.562218535,13.482877938,11.88766555,11.340267934,1.581027668,4.6517128553,-0.236006766,0.5500874246,-0.275168049,-0.03932286,-0.711068974,-0.715905023,-0.638263922,-0.039930521,0.1185770751,-0.157685182,0,0.0785839178,0.1179291639,0.1966143017,0.1975191594,0.3579525116,0,0.1197915627,3.6758893281,-4.691134151,4.7594697715,-2.750437123,1.6510082944,-2.202080179,-6.557636091,-6.085192698,1.1169618637,-2.515622816,3.7944664032,-4.848819332,4.7594697715,-2.671853205,1.7689374582,-2.005465878,-6.360116931,-5.727240186,1.1169618637,-2.395831254 +050,3,6,28,119,Mississippi,Quitman County,8223,8216,8152,8050,7796,7814,7689,7513,7361,7207,7053,6808,6760,-64,-102,-254,18,-125,-176,-152,-154,-154,-245,-48,18,101,116,108,88,108,87,96,82,75,70,43,119,109,107,87,86,100,92,95,85,107,-25,-18,7,1,1,22,-13,4,-13,-10,-37,0,6,4,7,10,3,0,0,0,0,0,-41,-90,-273,10,-140,-203,-139,-158,-141,-235,-11,-41,-84,-269,17,-130,-200,-139,-158,-141,-235,-11,2,0,8,0,4,2,0,0,0,0,0,164,164,162,164,164,164,137,132,115,127,136,142,12.467596593,14.640918844,13.837283792,11.352641424,14.208656756,11.69826543,13.179571664,11.500701262,10.821730034,10.318396226,14.689544501,13.757415121,13.709160794,11.223634135,11.31430075,13.446282103,12.630422845,13.32398317,12.264627372,15.77240566,-2.221947908,0.8835037233,0.1281229981,0.1290072889,2.8943560058,-1.748016673,0.5491488193,-1.823281907,-1.442897338,-5.454009434,0.7406493026,0.5048592705,0.8968609865,1.2900728891,0.3946849099,0,0,0,0,0,-11.10973954,-34.45664521,1.2812299808,-18.06102045,-26.70701224,-18.69033212,-21.69137836,-19.77559607,-33.90808744,-1.621462264,-10.36909024,-33.95178594,2.1780909673,-16.77094756,-26.31232733,-18.69033212,-21.69137836,-19.77559607,-33.90808744,-1.621462264 +050,3,6,28,121,Mississippi,Rankin County,141617,142049,142518,144209,145833,147361,148464,149507,152093,152902,154277,155342,155975,469,1691,1624,1528,1103,1043,2586,809,1375,1065,633,446,1993,1946,1875,1905,1834,1831,1797,1731,1723,1715,207,1053,1073,1022,1024,1114,1158,1164,1249,1232,1339,239,940,873,853,881,720,673,633,482,491,376,31,103,79,56,168,209,24,63,54,20,29,194,649,686,619,83,135,1881,120,840,552,218,225,752,765,675,251,344,1905,183,894,572,247,5,-1,-14,0,-29,-21,8,-7,-1,2,10,6073,6086,5920,5881,6021,5354,5044,6007,5882,6352,6239,6357,13.901725335,13.418746251,12.790166238,12.879236035,12.309922778,12.141909814,11.783799734,11.270301681,11.129807925,11.017708638,7.3449657688,7.3989284311,6.9714932775,6.9230119158,7.4772377178,7.6790450928,7.632912015,8.1320663196,7.9581679419,8.6021643534,6.5567595657,6.0198178195,5.8186729606,5.956224119,4.83268506,4.4628647215,4.1508877195,3.1382353611,3.1716399833,2.4155442844,0.7184534418,0.5447486916,0.3819996316,1.1358066424,1.4028210799,0.1591511936,0.4131215266,0.3515865342,0.129191038,0.1863052773,4.5269542108,4.7303493977,4.2224602141,0.5611425674,0.9061284487,12.473474801,0.7868981459,5.4691238659,3.5656726493,1.4005017394,5.2454076526,5.2750980892,4.6044598457,1.6969492098,2.3089495286,12.632625995,1.2000196725,5.8207104001,3.6948636873,1.5868070166 +050,3,6,28,123,Mississippi,Scott County,28264,28267,28342,28386,28360,28336,28552,28445,28378,28452,28344,28203,28061,75,44,-26,-24,216,-107,-67,74,-108,-141,-142,106,454,473,423,455,462,489,466,504,454,454,46,312,262,280,288,269,301,300,348,280,332,60,142,211,143,167,193,188,166,156,174,122,23,108,57,56,51,41,25,74,62,5,16,-5,-207,-299,-223,4,-343,-279,-166,-326,-319,-280,18,-99,-242,-167,55,-302,-254,-92,-264,-314,-264,-3,1,5,0,-6,2,-1,0,0,-1,0,229,229,228,228,227,228,228,228,228,211,185,184,16.006205049,16.670778557,14.921687597,15.996343693,16.211379546,17.211340478,16.399788844,17.747728713,16.057438945,16.138205602,10.999858976,9.2341310401,9.8772400169,10.125158206,9.4390932856,10.594301603,10.557803977,12.254384112,9.9032663094,11.80150718,5.0063460725,7.436647517,5.0444475801,5.8711854873,6.7722862607,6.6170388751,5.8419848671,5.4933446017,6.1541726352,4.3366984217,3.8076434918,2.0089521728,1.9754480034,1.7929967656,1.4386722108,0.8799253823,2.6042583143,2.1832523417,0.1768440412,0.568747334,-7.297983359,-10.53818771,-7.866516156,0.1406271973,-12.03572118,-9.819967267,-5.841984867,-11.47968167,-11.28264983,-9.953078345,-3.490339867,-8.529235541,-5.891068153,1.9336239629,-10.59704897,-8.940041884,-3.237726553,-9.296429326,-11.10580579,-9.384331011 +050,3,6,28,125,Mississippi,Sharkey County,4916,4916,4886,4877,4788,4681,4615,4568,4513,4419,4342,4312,4160,-30,-9,-89,-107,-66,-47,-55,-94,-77,-30,-152,19,72,89,61,64,63,48,61,59,67,57,3,68,58,73,81,59,60,54,87,33,50,16,4,31,-12,-17,4,-12,7,-28,34,7,0,1,1,1,2,1,0,1,2,2,1,-50,-14,-125,-99,-52,-52,-42,-102,-51,-65,-159,-50,-13,-124,-98,-50,-51,-42,-101,-49,-63,-158,4,0,4,3,1,0,-1,0,0,-1,-1,108,108,108,108,107,108,108,108,108,108,108,108,14.749564683,18.416968443,12.884148273,13.769363167,13.721006207,10.57152296,13.658755038,13.468782102,15.48416917,13.456090652,13.930144423,12.002069322,15.418734819,17.426850258,12.84983121,13.2144037,12.091356919,19.86074649,7.6265310839,11.803588291,0.8194202602,6.4148991205,-2.534586546,-3.657487091,0.8711749973,-2.64288074,1.5673981191,-6.391964388,7.8576380864,1.6525023607,0.204855065,0.2069322297,0.2112155455,0.430292599,0.2177937493,0,0.223914017,0.4565688848,0.4622140051,0.2360717658,-2.867970911,-25.86652871,-20.910339,-11.18760757,-11.32527496,-9.25008259,-22.83922974,-11.64250656,-15.02195517,-37.53541076,-2.663115846,-25.65959648,-20.69912346,-10.75731497,-11.10748122,-9.25008259,-22.61531572,-11.18593768,-14.55974116,-37.299339 +050,3,6,28,127,Mississippi,Simpson County,27503,27500,27527,27407,27426,27534,27517,27177,27001,26917,26739,26803,26629,27,-120,19,108,-17,-340,-176,-84,-178,64,-174,91,362,351,314,344,291,303,277,333,333,324,43,301,295,303,288,328,309,321,327,286,324,48,61,56,11,56,-37,-6,-44,6,47,0,2,31,12,8,13,14,0,8,13,12,10,-19,-213,-46,91,-81,-318,-169,-46,-196,5,-183,-17,-182,-34,99,-68,-304,-169,-38,-183,17,-173,-4,1,-3,-2,-5,1,-1,-2,-1,0,-1,642,642,641,631,634,635,630,621,609,544,545,545,13.179451706,12.802509438,11.426491994,12.497502316,10.641020953,11.185351988,10.274861827,12.41240495,12.438833066,12.127564007,10.958604871,10.759943829,11.026200873,10.463025195,11.994002999,11.406844106,11.906969843,12.188758014,10.683201972,12.127564007,2.2208468344,2.0425656083,0.4002911208,2.0344771212,-1.352982046,-0.221492119,-1.632108016,0.223646936,1.7556310933,0,1.1286270798,0.4376926304,0.2911208151,0.4722893317,0.5119391524,0,0.296746912,0.4845683614,0.4482462366,0.3743075311,-7.754760258,-1.67782175,3.3114992722,-2.942725836,-11.62833218,-6.238694673,-1.706294744,-7.305799911,0.1867692652,-6.849827819,-6.626133178,-1.240129119,3.6026200873,-2.470436504,-11.11639302,-6.238694673,-1.409547832,-6.821231549,0.6350155018,-6.475520287 +050,3,6,28,129,Mississippi,Smith County,16491,16484,16494,16523,16334,16226,16207,16073,15943,16067,15967,15840,15779,10,29,-189,-108,-19,-134,-130,124,-100,-127,-61,58,217,178,191,185,182,181,189,187,202,188,15,144,166,172,175,198,173,166,155,173,197,43,73,12,19,10,-16,8,23,32,29,-9,0,-1,0,0,0,1,1,1,1,1,0,-34,-42,-204,-128,-29,-117,-138,100,-133,-158,-51,-34,-43,-204,-128,-29,-116,-137,101,-132,-157,-51,1,-1,3,1,0,-2,-1,0,0,1,-1,107,107,109,107,104,108,108,108,112,117,118,118,13.144743617,10.834829717,11.732186732,11.408133691,11.276332094,11.306846577,11.808809747,11.675095211,12.701606565,11.891584174,8.7227791744,10.104391758,10.565110565,10.791477816,12.267657993,10.807096452,10.371758825,9.6772179559,10.878108592,12.46086214,4.4219644426,0.7304379584,1.1670761671,0.6166558752,-0.991325898,0.4997501249,1.4370509216,1.9978772554,1.8234979721,-0.569277966,-0.060574855,0,0,0,0.0619578686,0.0624687656,0.0624804749,0.0624336642,0.0628792404,0,-2.544143926,-12.41744529,-7.862407862,-1.788302038,-7.249070632,-8.620689655,6.2480474852,-8.303677343,-9.934919986,-3.225908473,-2.604718781,-12.41744529,-7.862407862,-1.788302038,-7.187112763,-8.55822089,6.31052796,-8.241243679,-9.872040746,-3.225908473 +050,3,6,28,131,Mississippi,Stone County,17786,17790,17907,17900,18051,17967,18100,18283,18189,18608,17966,18289,18360,117,-7,151,-84,133,183,-94,419,-642,323,71,54,206,208,207,210,239,211,202,223,215,218,25,171,207,176,172,153,219,183,199,165,199,29,35,1,31,38,86,-8,19,24,50,19,0,6,9,12,4,3,0,3,0,-1,0,83,-47,136,-128,87,95,-84,393,-672,273,51,83,-41,145,-116,91,98,-84,396,-672,272,51,5,-1,5,1,4,-1,-2,4,6,1,1,1288,1288,1370,1438,1410,1645,1638,1657,1916,1225,1267,1276,11.506130086,11.571305388,11.494252874,11.644994039,13.138004013,11.570519851,10.979155909,12.194455077,11.860433044,11.896641109,9.5512050716,11.515674112,9.7728913321,9.5378046414,8.4105213974,12.009212547,9.9464630269,10.882047356,9.102192801,10.859777893,1.9549250147,0.0556312759,1.7213615415,2.1071893975,4.7274826155,-0.438692696,1.0326928826,1.3124077213,2.7582402427,1.0368632159,0.3351300025,0.5006814831,0.6663334999,0.2218094103,0.1649121843,0,0.1630567709,0,-0.055164805,0,-2.62518502,7.5658535229,-7.107557332,4.8243546732,5.2222191683,-4.606273306,21.360436992,-36.7474162,15.059991725,2.7831591585,-2.290055017,8.066535006,-6.441223833,5.0461640835,5.3871313526,-4.606273306,21.523493763,-36.7474162,15.00482692,2.7831591585 +050,3,6,28,133,Mississippi,Sunflower County,29450,29383,28983,28519,28415,27910,27408,26883,26519,26149,26254,25131,24740,-400,-464,-104,-505,-502,-525,-364,-370,105,-1123,-391,91,370,355,319,332,331,321,283,295,274,271,38,329,294,300,306,281,301,334,309,333,322,53,41,61,19,26,50,20,-51,-14,-59,-51,1,2,0,5,12,7,6,6,10,-1,2,-509,-509,-160,-537,-553,-591,-390,-326,108,-1064,-341,-508,-507,-160,-532,-541,-584,-384,-320,118,-1065,-339,55,2,-5,8,13,9,0,1,1,1,-1,4589,4199,3911,4097,4199,4092,3906,4024,4109,4600,4042,4053,12.869117596,12.47057997,11.327119396,12.003326223,12.193549575,12.022021647,10.746563378,11.258897391,10.664590834,10.868039542,11.443080241,10.327747919,10.652463382,11.063306699,10.351623658,11.27298603,12.68322321,11.793217946,12.960980831,12.913316356,1.4260373552,2.1428320511,0.6746560142,0.9400195235,1.8419259177,0.7490356166,-1.936659831,-0.534320554,-2.296389997,-2.045276814,0.0695627978,0,0.1775410564,0.4338551647,0.2578696285,0.224710685,0.2278423331,0.3816575387,-0.038921864,0.0802069339,-17.70373204,-5.620543085,-19.06790945,-19.99349217,-21.77156435,-14.60619452,-12.37943343,4.1219014179,-41.41286368,-13.67528223,-17.63416925,-5.620543085,-18.8903684,-19.55963701,-21.51369472,-14.38148384,-12.1515911,4.5035589565,-41.45178554,-13.59507529 +050,3,6,28,135,Mississippi,Tallahatchie County,15378,15385,15337,15329,15045,14977,14724,14619,14383,14155,14028,13931,13707,-48,-8,-284,-68,-253,-105,-236,-228,-127,-97,-224,44,176,155,142,163,166,154,167,164,161,155,61,138,160,159,152,161,145,159,158,128,157,-17,38,-5,-17,11,5,9,8,6,33,-2,0,-3,-6,-12,-1,0,-5,9,5,-4,1,-32,-42,-282,-37,-270,-110,-240,-248,-139,-126,-220,-32,-45,-288,-49,-271,-110,-245,-239,-134,-130,-219,1,-1,9,-2,7,0,0,3,1,0,-3,2421,2426,2432,2454,2449,2446,2442,2441,2440,2445,2460,2462,11.478510402,10.20609732,9.4597295317,10.976061412,11.314453192,10.619957244,11.703693321,11.638221623,11.516863979,11.216441132,9.0001956564,10.535326266,10.592232363,10.235345611,10.973656409,9.9993103924,11.143037354,11.212433027,9.1562645302,11.361169404,2.478314746,-0.329228946,-1.132502831,0.7407158008,0.3407967829,0.6206468519,0.5606559675,0.425788596,2.3605994492,-0.144728273,-0.195656427,-0.395074735,-0.799413763,-0.0673378,0,-0.344803807,0.6307379634,0.35482383,-0.286133267,0.0723641363,-2.739189982,-18.56851254,-2.464859103,-18.18120602,-7.497529223,-16.55058272,-17.38033499,-9.864102473,-9.013197897,-15.92010999,-2.93484641,-18.96358728,-3.264272867,-18.24854382,-7.497529223,-16.89538653,-16.74959703,-9.509278643,-9.299331163,-15.84774586 +050,3,6,28,137,Mississippi,Tate County,28886,28863,28978,28734,28519,28341,28244,28465,28310,28595,28345,28304,28539,115,-244,-215,-178,-97,221,-155,285,-250,-41,235,76,369,340,311,326,327,344,325,369,344,352,39,288,242,294,268,308,296,297,306,298,318,37,81,98,17,58,19,48,28,63,46,34,1,9,0,2,14,13,-2,23,8,-1,-2,74,-336,-319,-196,-169,188,-201,234,-323,-85,203,75,-327,-319,-194,-155,201,-203,257,-315,-86,201,3,2,6,-1,0,1,0,0,2,-1,0,1281,1281,1301,1286,1279,1305,1383,1380,1454,1148,1101,1066,12.787635154,11.877106876,10.939148786,11.522488292,11.532560969,12.118009687,11.422546349,12.961011591,12.144962841,12.384990236,9.9805932908,8.4537054827,10.341188885,9.4724750376,10.862473329,10.427124615,10.438450048,10.748155954,10.520927113,11.18871277,2.807041863,3.4234013938,0.5979599015,2.0500132544,0.6700876404,1.6908850727,0.9840963009,2.2128556375,1.6240357288,1.196277466,0.3118935403,0,0.0703482237,0.4948307855,0.4584810171,-0.070453545,0.8083648186,0.2809975413,-0.035305125,-0.070369263,-11.64402551,-11.14352086,-6.894125923,-5.973314483,6.630340863,-7.080581242,8.2242333714,-11.34527573,-3.000935586,7.1424801647,-11.33213197,-11.14352086,-6.8237777,-5.478483697,7.0888218801,-7.151034786,9.03259819,-11.06427819,-3.03624071,7.072110902 +050,3,6,28,139,Mississippi,Tippah County,22232,22232,22184,22038,21914,22000,21976,22025,22079,21963,22071,22021,21748,-48,-146,-124,86,-24,49,54,-116,108,-50,-273,67,265,261,274,278,280,284,255,293,239,250,90,262,261,259,268,265,276,291,280,249,261,-23,3,0,15,10,15,8,-36,13,-10,-11,5,20,7,-7,-6,7,4,10,-2,-7,-5,-28,-170,-131,79,-25,29,43,-89,98,-32,-256,-23,-150,-124,72,-31,36,47,-79,96,-39,-261,-2,1,0,-1,-3,-2,-1,-1,-1,-1,-1,287,287,284,268,278,311,329,329,337,354,333,324,11.984984849,11.876592647,12.478936102,12.64325996,12.726983478,12.878650463,11.579855592,13.307898442,10.840968883,11.423610318,11.849305775,11.876592647,11.795782666,12.188466436,12.045180791,12.515871576,13.214658735,12.71744561,11.294565908,11.926249172,0.1356790738,0,0.6831534363,0.4547935237,0.6818026863,0.3627788863,-1.634803142,0.5904528319,-0.453597024,-0.502638854,0.9045271584,0.3185293047,-0.318804937,-0.272876114,0.3181745869,0.1813894431,0.454111984,-0.090838897,-0.317517917,-0.228472206,-7.688480847,-5.961048416,3.597941431,-1.136983809,1.3181518602,1.9499365137,-4.041596658,4.4511059636,-1.451510478,-11.69777697,-6.783953688,-5.642519112,3.2791364941,-1.409859924,1.6363264471,2.1313259568,-3.587484674,4.3602670664,-1.769028395,-11.92624917 +050,3,6,28,141,Mississippi,Tishomingo County,19593,19598,19624,19634,19617,19505,19429,19485,19455,19520,19360,19368,19275,26,10,-17,-112,-76,56,-30,65,-160,8,-93,52,190,210,203,188,196,213,198,213,199,190,42,261,300,295,293,296,298,293,295,275,300,10,-71,-90,-92,-105,-100,-85,-95,-82,-76,-110,2,3,-3,3,14,9,5,13,2,-3,-2,14,81,76,-20,19,146,53,148,-79,85,18,16,84,73,-17,33,155,58,161,-77,82,16,0,-3,0,-3,-4,1,-3,-1,-1,2,1,280,280,281,279,277,279,279,279,280,282,283,283,9.6795557593,10.700364322,10.377792546,9.6573688807,10.0734954,10.93990755,10.160359205,10.956790123,10.276802314,9.8336050514,13.296652912,15.286234746,15.081028577,15.051112138,15.21303387,15.305598356,15.035279025,15.174897119,14.201611237,15.526744818,-3.617097152,-4.585870424,-4.703236031,-5.393743258,-5.139538469,-4.365690806,-4.87491982,-4.218106996,-3.924808924,-5.693139767,0.1528350909,-0.152862347,0.1533663923,0.7191657677,0.4625584623,0.2568053416,0.6670942912,0.1028806584,-0.154926668,-0.103511632,4.1265474553,3.8725128022,-1.022442615,0.9760106847,7.5037261654,2.7221366204,7.5946119307,-4.063786008,4.3895889279,0.9316046891,4.2793825462,3.7196504548,-0.869076223,1.6951764525,7.9662846276,2.978941962,8.2617062219,-3.96090535,4.2346622599,0.828093057 +050,3,6,28,143,Mississippi,Tunica County,10778,10778,10763,10589,10438,10454,10496,10264,10138,9989,9916,9602,9392,-15,-174,-151,16,42,-232,-126,-149,-73,-314,-210,46,189,203,201,196,190,180,176,189,159,155,10,131,97,115,87,100,111,99,118,113,100,36,58,106,86,109,90,69,77,71,46,55,14,21,4,2,4,7,3,3,6,5,4,-71,-253,-270,-70,-72,-332,-199,-228,-151,-365,-266,-57,-232,-266,-68,-68,-325,-196,-225,-145,-360,-262,6,0,9,-2,1,3,1,-1,1,0,-3,104,104,104,104,104,104,104,104,104,104,104,104,17.703259648,19.308508109,19.241815049,18.711217184,18.304431599,17.645328889,17.488945198,18.990203466,16.292652936,16.320943456,12.270513301,9.2262329386,11.00899866,8.3054892601,9.633911368,10.881286148,9.8375316739,11.856317508,11.579055231,10.529640939,5.4327463469,10.08227517,8.232816389,10.405727924,8.6705202312,6.7640427409,7.6514135241,7.1338859583,4.7135977047,5.7913025166,1.9670288498,0.380463214,0.1914608463,0.3818615752,0.6743737958,0.2940888148,0.2981070204,0.6028636021,0.5123475766,0.4211856376,-23.69801424,-25.68126694,-6.701129619,-6.873508353,-31.98458574,-19.50789138,-22.65613355,-15.17206732,-37.40137309,-28.0088449,-21.73098539,-25.30080373,-6.509668773,-6.491646778,-31.31021195,-19.21380257,-22.35802653,-14.56920372,-36.88902551,-27.58765926 +050,3,6,28,145,Mississippi,Union County,27134,27131,27141,27305,27339,27763,28152,28309,28298,28478,28536,28711,28866,10,164,34,424,389,157,-11,180,58,175,155,81,334,347,395,390,346,385,389,373,342,348,73,267,288,253,285,317,306,317,327,276,297,8,67,59,142,105,29,79,72,46,66,51,2,34,29,29,56,53,9,25,26,19,15,2,64,-49,251,226,79,-98,84,-13,92,87,4,98,-20,280,282,132,-89,109,13,111,102,-2,-1,-5,2,2,-4,-1,-1,-1,-2,2,283,283,277,269,277,281,281,281,283,282,277,277,12.269037211,12.700387966,14.337047657,13.949745149,12.256247675,13.602557988,13.702973087,13.08450556,11.948224361,12.088160203,9.8078830401,10.540956006,9.1829697652,10.194044532,11.228989922,10.811383751,11.166690151,11.470866805,9.6424266774,10.316619483,2.4611541711,2.1594319596,5.1540778919,3.755700617,1.0272577531,2.7911742364,2.5362829365,1.6136387554,2.3057976837,1.7715407194,1.2489439077,1.061415709,1.0525933723,2.0030403291,1.8774021006,0.317981875,0.8806537974,0.9120566878,0.6637902423,0.5210413881,2.3509532381,-1.793426543,9.1103771188,8.0836984709,2.7983918103,-3.462469306,2.9589967592,-0.456028344,3.2141422258,3.0220400507,3.5998971458,-0.732010834,10.162970491,10.0867388,4.6757939108,-3.144487431,3.8396505566,0.4560283439,3.8779324681,3.5430814388 +050,3,6,28,147,Mississippi,Walthall County,15443,15440,15395,15372,15069,14853,14844,14604,14568,14515,14420,14316,14294,-45,-23,-303,-216,-9,-240,-36,-53,-95,-104,-22,50,213,173,170,179,179,174,167,184,156,160,66,187,163,172,208,189,194,166,210,160,190,-16,26,10,-2,-29,-10,-20,1,-26,-4,-30,0,5,0,-2,0,3,-2,0,0,0,1,-30,-53,-322,-216,23,-234,-12,-53,-69,-100,7,-30,-48,-322,-218,23,-231,-14,-53,-69,-100,8,1,-1,9,4,-3,1,-2,-1,0,0,0,128,128,127,127,122,127,127,127,129,121,102,102,13.846003835,11.366249466,11.362876813,12.05508974,12.157022548,11.929247223,11.484372314,12.718161396,10.857461024,11.184900384,12.155881301,10.709240827,11.496557717,14.008148971,12.836185819,13.300425065,11.415603617,14.515292898,11.135857461,13.282069207,1.6901225339,0.6570086397,-0.133680904,-1.953059232,-0.679163271,-1.371177842,0.0687686965,-1.797131502,-0.278396437,-2.097168822,0.3250235642,0,-0.133680904,0,0.2037489813,-0.137117784,0,0,0,0.0699056274,-3.445249781,-21.1556782,-14.4375376,1.5489780112,-15.89242054,-0.822706705,-3.644740914,-4.769310524,-6.959910913,0.4893393918,-3.120226216,-21.1556782,-14.5712185,1.5489780112,-15.68867156,-0.959824489,-3.644740914,-4.769310524,-6.959910913,0.5592450192 +050,3,6,28,149,Mississippi,Warren County,48773,48770,48833,48325,48226,48301,47951,47496,47017,46717,46096,45477,44841,63,-508,-99,75,-350,-455,-479,-300,-621,-619,-636,157,623,608,620,620,639,667,579,575,598,555,76,535,462,524,513,572,590,536,540,460,534,81,88,146,96,107,67,77,43,35,138,21,6,31,32,34,25,0,9,18,43,33,26,-21,-630,-276,-45,-486,-526,-565,-362,-700,-789,-681,-15,-599,-244,-11,-461,-526,-556,-344,-657,-756,-655,-3,3,-1,-10,4,4,0,1,1,-1,-2,524,524,524,526,525,524,524,524,524,524,522,522,12.824471479,12.594380172,12.846146674,12.882849188,13.389629847,14.114460445,12.354108435,12.39050564,13.060618305,12.289908988,11.012989152,9.5700717755,10.857065899,10.659518763,11.985709347,12.485054966,11.436618516,11.636300949,10.046629465,11.824885405,1.8114823278,3.0243083966,1.9890807753,2.2233304243,1.4039205004,1.6294054786,0.9174899183,0.7542046912,3.0139888395,0.4650235833,0.63813582,0.6628621143,0.7044661079,0.5194697253,0,0.190449991,0.3840655472,0.9265943348,0.7207364616,0.5757434841,-12.96856666,-5.717185736,-0.932381613,-10.09849146,-11.02182363,-11.95602721,-7.723984893,-15.08409382,-17.23215358,-15.08005049,-12.33043084,-5.054323622,-0.227915506,-9.579021735,-11.02182363,-11.76557722,-7.339919346,-14.15749949,-16.51141712,-14.504307 +050,3,6,28,151,Mississippi,Washington County,51137,51135,51098,50465,50035,49679,49032,47991,47214,46238,45097,43973,42837,-37,-633,-430,-356,-647,-1041,-777,-976,-1141,-1124,-1136,188,819,836,794,785,748,677,630,644,581,573,95,583,604,597,612,586,584,576,614,601,671,93,236,232,197,173,162,93,54,30,-20,-98,1,2,2,19,37,35,12,12,18,12,13,-135,-876,-674,-576,-875,-1254,-884,-1045,-1194,-1114,-1044,-134,-874,-672,-557,-838,-1219,-872,-1033,-1176,-1102,-1031,4,5,10,4,18,16,2,3,5,-2,-7,548,548,548,774,842,811,728,730,732,673,608,595,16.127920601,16.63681592,15.925547065,15.905015652,15.419024355,14.221942125,13.48285751,14.101932446,13.04591894,13.201244096,11.480558865,12.019900498,11.974246345,12.399833858,12.079609989,12.268263221,12.327184009,13.445010128,13.495003929,15.459048497,4.6473617361,4.6169154229,3.9513007201,3.5051817933,3.3394143657,1.9536789034,1.1556735008,0.6569223189,-0.449084989,-2.2578044,0.0393844215,0.039800995,0.3810899172,0.7496631581,0.7214784123,0.2520876004,0.2568163335,0.3941533914,0.2694509936,0.2995046654,-17.25037661,-13.41293532,-11.5530417,-17.72852063,-25.84954083,-18.57045323,-22.36442238,-26.14550829,-25.01403391,-24.05252851,-17.21099219,-13.37313433,-11.17195178,-16.97885747,-25.12806242,-18.31836563,-22.10760604,-25.7513549,-24.74458291,-23.75302385 +050,3,6,28,153,Mississippi,Wayne County,20747,20754,20782,20629,20628,20476,20473,20515,20476,20450,20289,20186,20317,28,-153,-1,-152,-3,42,-39,-26,-161,-103,131,77,318,277,266,282,312,294,271,262,276,265,48,221,224,224,220,216,242,213,244,207,216,29,97,53,42,62,96,52,58,18,69,49,0,-3,-3,-4,-4,0,0,0,0,0,0,1,-249,-52,-189,-60,-51,-90,-84,-179,-173,83,1,-252,-55,-193,-64,-51,-90,-84,-179,-173,83,-2,2,1,-1,-1,-3,-1,0,0,1,-1,137,137,137,137,137,137,137,137,137,137,137,137,15.358238149,13.428024335,12.942779292,13.773230116,15.223967991,14.344612232,13.243414944,12.862367756,13.638048178,13.08545046,10.67349255,10.858763361,10.899182561,10.74507314,10.539670147,11.807469932,10.409030934,11.978693635,10.228536133,10.665876602,4.684745599,2.5692609739,2.0435967302,3.0281569758,4.6842978433,2.5371422995,2.8343840102,0.8836741206,3.4095120445,2.4195738587,-0.144889039,-0.145429866,-0.19462826,-0.195364966,0,0,0,0,0,0,-12.02579025,-2.520784352,-9.196185286,-2.930474493,-2.488533229,-4.391207826,-4.104969946,-8.7876482,-8.54848672,4.0984618423,-12.17067929,-2.666214218,-9.390813546,-3.125839459,-2.488533229,-4.391207826,-4.104969946,-8.7876482,-8.54848672,4.0984618423 +050,3,6,28,155,Mississippi,Webster County,10253,10263,10267,10194,10090,9951,10000,9881,9768,9743,9748,9702,9676,4,-73,-104,-139,49,-119,-113,-25,5,-46,-26,35,130,124,120,136,92,121,120,123,123,118,49,128,126,164,138,137,140,144,155,110,144,-14,2,-2,-44,-2,-45,-19,-24,-32,13,-26,0,0,0,0,0,-1,-2,-2,-2,-2,-1,17,-75,-103,-95,51,-72,-92,2,39,-56,0,17,-75,-103,-95,51,-73,-94,0,37,-58,-1,1,0,1,0,0,-1,0,-1,0,-1,1,56,56,57,58,57,54,54,54,47,54,55,55,12.707101315,12.226385328,11.975450327,13.633401834,9.2550676525,12.316148404,12.300753421,12.621209789,12.64781491,12.178759418,12.511607448,12.423585092,16.36644878,13.833893038,13.782002917,14.250089063,14.760904105,15.904776564,11.311053985,14.862214883,0.1954938664,-0.197199763,-4.390998453,-0.200491203,-4.526935265,-1.933940659,-2.460150684,-3.283566774,1.3367609254,-2.683455465,0,0,0,0,-0.100598561,-0.203572701,-0.205012557,-0.205222923,-0.205655527,-0.103209826,-7.331019989,-10.15578781,-9.480564842,5.1125256879,-7.243096424,-9.364344241,0.205012557,4.0018470063,-5.758354756,0,-7.331019989,-10.15578781,-9.480564842,5.1125256879,-7.343694985,-9.567916942,0,3.7966240829,-5.964010283,-0.103209826 +050,3,6,28,157,Mississippi,Wilkinson County,9878,9878,9863,9582,9460,9340,9185,9089,9032,8855,8768,8628,8351,-15,-281,-122,-120,-155,-96,-57,-177,-87,-140,-277,28,145,102,119,107,111,106,86,89,91,94,13,137,96,110,115,128,138,118,147,103,132,15,8,6,9,-8,-17,-32,-32,-58,-12,-38,0,0,0,0,0,0,-1,-1,-1,-1,-1,-31,-291,-133,-128,-149,-80,-22,-146,-27,-126,-236,-31,-291,-133,-128,-149,-80,-23,-147,-28,-127,-237,1,2,5,-1,2,1,-2,2,-1,-1,-2,1168,1168,1086,1104,1077,1058,1061,1086,1111,1114,1109,1061,14.913859604,10.713160382,12.659574468,11.551956815,12.148407574,11.699133602,9.6159221781,10.100436929,10.462175213,11.072501325,14.091025971,10.082974477,11.70212766,12.415654521,14.008974499,15.230947519,13.193939733,16.682744141,11.841802713,15.548618882,0.8228336333,0.6301859048,0.9574468085,-0.863697706,-1.860566926,-3.531813918,-3.578017555,-6.582307212,-1.379627501,-4.476117557,0,0,0,0,0,-0.110369185,-0.111813049,-0.113488055,-0.114968958,-0.117792567,-29.93057341,-13.96912089,-13.61702128,-16.08636977,-8.755609062,-2.428122068,-16.32470509,-3.064177495,-14.48608876,-27.79904588,-29.93057341,-13.96912089,-13.61702128,-16.08636977,-8.755609062,-2.538491253,-16.43651814,-3.177665551,-14.60105771,-27.91683845 +050,3,6,28,159,Mississippi,Winston County,19198,19201,19202,19045,18981,18764,18610,18452,18357,18232,18154,17993,17845,1,-157,-64,-217,-154,-158,-95,-125,-78,-161,-148,45,218,203,191,194,188,214,181,199,197,192,27,229,222,238,256,194,240,218,264,221,248,18,-11,-19,-47,-62,-6,-26,-37,-65,-24,-56,0,-2,0,-2,-1,-1,-1,-3,-2,-2,-1,-17,-144,-40,-170,-92,-149,-68,-83,-10,-135,-91,-17,-146,-40,-172,-93,-150,-69,-86,-12,-137,-92,0,0,-5,2,1,-2,0,-2,-1,0,0,408,408,410,465,460,468,445,448,451,450,458,459,11.399586896,10.676905275,10.120545768,10.38154867,10.145162161,11.627591078,9.8936838941,10.938272962,10.899936371,10.714883643,11.974795409,11.676221533,12.610941847,13.699363194,10.468943932,13.04028906,11.916149662,14.511075688,12.227847401,13.840058039,-0.575208513,-0.999316257,-2.490396079,-3.317814523,-0.323781771,-1.412697981,-2.022465768,-3.572802726,-1.32791103,-3.125174396,-0.104583366,0,-0.105974301,-0.053513137,-0.053963629,-0.054334538,-0.163983711,-0.109932392,-0.110659252,-0.055806686,-7.530002353,-2.1038237,-9.007815605,-4.923208648,-8.040580649,-3.694748567,-4.53688267,-0.549661958,-7.469499544,-5.078408393,-7.634585719,-2.1038237,-9.113789906,-4.976721785,-8.094544277,-3.749083105,-4.700866381,-0.659594349,-7.580158796,-5.134215079 +050,3,6,28,161,Mississippi,Yalobusha County,12678,12678,12626,12518,12391,12377,12304,12457,12469,12449,12376,12104,11982,-52,-108,-127,-14,-73,153,12,-20,-73,-272,-122,31,174,140,146,145,170,170,146,157,143,139,55,176,157,168,166,186,164,186,175,191,191,-24,-2,-17,-22,-21,-16,6,-40,-18,-48,-52,0,0,0,0,0,0,-2,-1,-1,-1,-1,-29,-106,-110,10,-49,167,10,20,-53,-222,-68,-29,-106,-110,10,-49,167,8,19,-54,-223,-69,1,0,0,-2,-3,2,-2,1,-1,-1,-1,155,155,154,155,155,156,156,156,156,154,151,151,13.840279987,11.240916938,11.789405685,11.749929095,13.73127095,13.640375512,11.718436472,12.648539778,11.683006536,11.541974591,13.999363665,12.605885423,13.565891473,13.451642964,15.023625863,13.158950493,14.928967012,14.098690836,15.604575163,15.859835589,-0.159083678,-1.364968485,-1.776485788,-1.701713869,-1.292354913,0.4814250181,-3.21053054,-1.450151057,-3.921568627,-4.317860998,0,0,0,0,0,-0.160475006,-0.080263264,-0.080563948,-0.081699346,-0.083035788,-8.431434935,-8.832149022,0.8074935401,-3.970665694,13.488954404,0.8023750301,1.6052652701,-4.269889225,-18.1372549,-5.646433613,-8.431434935,-8.832149022,0.8074935401,-3.970665694,13.488954404,0.6419000241,1.5250020066,-4.350453172,-18.21895425,-5.729469401 +050,3,6,28,163,Mississippi,Yazoo County,28065,28065,28135,28275,28336,28002,27810,27424,28003,28711,29163,29698,26982,70,140,61,-334,-192,-386,579,708,452,535,-2716,86,405,381,370,344,338,323,276,347,317,309,35,253,266,320,319,307,308,312,310,307,287,51,152,115,50,25,31,15,-36,37,10,22,2,19,17,12,7,32,60,227,105,-16,2,14,-31,-68,-403,-227,-455,498,511,305,539,-2720,16,-12,-51,-391,-220,-423,558,738,410,523,-2718,3,0,-3,7,3,6,6,6,5,2,-20,4020,4111,4336,4477,4389,4388,4131,4845,5572,6195,6962,4577,14.359156178,13.460281571,13.135006568,12.327098115,12.238838397,11.6549696,9.7330465141,11.991567889,10.771138785,10.903316867,8.9700407729,9.3974669234,11.36000568,11.431233427,11.116341384,11.113717141,11.00257432,10.712928085,10.431355227,10.127028934,5.3891154051,4.0628146473,1.7750008875,0.8958646886,1.1224970127,0.5412524582,-1.269527806,1.2786398037,0.3397835579,0.7762879323,0.6736394256,0.6005899913,0.426000213,0.2508421128,1.1587065938,2.1650098328,8.0050781112,3.6285724159,-0.543653693,0.0705716302,-1.099095905,-2.402359965,-14.30650715,-8.134451372,-16.47535938,17.969581612,18.020241916,10.540138922,18.314333769,-95.97741708,-0.425456479,-1.801769974,-13.88050694,-7.88360926,-15.31665279,20.134591445,26.025320027,14.168711338,17.770680077,-95.90684545 +040,2,4,29,000,Missouri,Missouri,5988927,5988941,5996089,6011182,6026027,6042989,6059130,6075411,6091384,6111382,6125986,6140475,6151548,7148,15093,14845,16962,16141,16281,15973,19998,14604,14489,11073,19006,76231,75455,75145,75786,75159,74828,73719,73548,72622,71982,13192,55944,55614,57556,57100,59995,59202,61343,63123,60883,65045,5814,20287,19841,17589,18686,15164,15626,12376,10425,11739,6937,2007,9118,7165,6101,6917,9806,6232,8714,6373,6657,5360,-510,-14274,-11778,-6395,-9013,-8339,-5798,-1007,-2096,-3916,-1267,1497,-5156,-4613,-294,-2096,1467,434,7707,4277,2741,4093,-163,-38,-383,-333,-449,-350,-87,-85,-98,9,43,174134,173893,174040,174573,175054,175360,175401,175547,175175,174578,170914,166664,12.697473056,12.536959357,12.452547913,12.524418244,12.387613178,12.300363407,12.082342643,12.020231801,11.840742004,11.711985895,9.3183538541,9.240347991,9.5378115333,9.4363639954,9.8883015023,9.7317329667,10.053950063,10.316434057,9.9267425217,10.583286413,3.379119202,3.2966113656,2.9147363795,3.088054249,2.4993116757,2.5686304405,2.0283925792,1.7037977447,1.913999482,1.1286994826,1.5187464329,1.1904753004,1.0110186282,1.1431055999,1.6162127599,1.0244275506,1.4282007866,1.0415638395,1.0853986329,0.8721103109,-2.377559397,-1.956932043,-1.059738424,-1.489491221,-1.374423639,-0.953085837,-0.165044548,-0.342557321,-0.638488966,-0.206149956,-0.858812964,-0.766456743,-0.048719796,-0.346385621,0.2417891208,0.0713417132,1.2631562385,0.6990065184,0.4469096669,0.6659603549 +050,2,4,29,001,Missouri,Adair County,25607,25617,25638,25676,25696,25728,25552,25396,25313,25522,25593,25511,25399,21,38,20,32,-176,-156,-83,209,71,-82,-112,68,243,275,242,242,276,266,265,282,293,288,29,205,220,234,213,229,220,215,241,222,229,39,38,55,8,29,47,46,50,41,71,59,19,101,86,72,60,102,120,139,114,122,92,-36,-102,-118,-45,-270,-308,-250,21,-85,-276,-264,-17,-1,-32,27,-210,-206,-130,160,29,-154,-172,-1,1,-3,-3,5,3,1,-1,1,1,1,2900,2900,2900,2900,2904,2905,2907,2910,2913,2915,2915,2916,9.471099505,10.706221288,9.4119477287,9.4383775351,10.834576431,10.491234298,10.425887676,11.03394307,11.466812774,11.314083677,7.9900222162,8.5649770303,9.1008089608,8.3073322933,8.9895579807,8.6769606973,8.4587390577,9.4297173041,8.68816531,8.9962679238,1.4810772888,2.1412442576,0.3111387679,1.1310452418,1.8450184502,1.8142736003,1.9671486181,1.6042257654,2.778647464,2.3178157533,3.9365475309,3.3481273846,2.800248911,2.3400936037,4.004082594,4.7328876531,5.4686731583,4.4605301771,4.7745773325,3.6142211746,-3.975523249,-4.593942225,-1.750155569,-10.53042122,-12.09075921,-9.860182611,0.8262024196,-3.325833904,-10.80150282,-10.37124337,-0.038975718,-1.245814841,1.0500933416,-8.190327613,-8.086676611,-5.127294958,6.2948755778,1.1346962731,-6.026925485,-6.757022196 +050,2,4,29,003,Missouri,Andrew County,17291,17296,17345,17199,17311,17306,17284,17316,17351,17473,17661,17699,17586,49,-146,112,-5,-22,32,35,122,188,38,-113,32,174,185,172,200,204,190,185,187,201,200,36,140,171,171,167,167,200,154,157,151,184,-4,34,14,1,33,37,-10,31,30,50,16,0,0,-1,-2,-2,-3,-4,0,-2,-1,-1,52,-180,101,-2,-52,-1,50,93,162,-10,-129,52,-180,100,-4,-54,-4,46,93,160,-11,-130,1,0,-2,-2,-1,-1,-1,-2,-2,-1,1,192,192,192,192,192,192,192,192,192,192,192,192,10.074108384,10.721529991,9.9373140365,11.564035849,11.791907514,10.961433063,10.624856421,10.644959299,11.368778281,11.336261868,8.1056044465,9.9101709649,9.8795389548,9.6559699335,9.6531791908,11.538350593,8.8444750747,8.9372118176,8.5407239819,10.429360918,1.968503937,0.8113590264,0.0577750816,1.908065915,2.1387283237,-0.57691753,1.7803813462,1.7077474811,2.8280542986,0.9069009494,0,-0.057954216,-0.115550163,-0.115640358,-0.173410405,-0.230767012,0,-0.113849832,-0.056561086,-0.056681309,-10.42149143,5.8533758331,-0.115550163,-3.006649321,-0.057803468,2.8845876482,5.3411440386,9.2218363978,-0.56561086,-7.311888905,-10.42149143,5.7954216169,-0.231100326,-3.122289679,-0.231213873,2.6538206363,5.3411440386,9.1079865657,-0.622171946,-7.368570214 +050,2,4,29,005,Missouri,Atchison County,5685,5683,5656,5572,5512,5418,5354,5292,5292,5242,5161,5109,5096,-27,-84,-60,-94,-64,-62,0,-50,-81,-52,-13,11,60,46,65,46,51,65,44,46,42,44,13,91,83,78,66,84,67,75,72,71,84,-2,-31,-37,-13,-20,-33,-2,-31,-26,-29,-40,0,0,0,4,1,1,1,2,2,2,2,-28,-53,-24,-89,-45,-31,1,-20,-58,-24,25,-28,-53,-24,-85,-44,-30,2,-18,-56,-22,27,3,0,1,4,0,1,0,-1,1,-1,0,98,98,98,98,98,98,98,98,98,98,98,98,10.687566797,8.3002526164,11.893870082,8.5406609729,9.5810633102,12.282690854,8.3539016518,8.8436028069,8.1791626095,8.6232239098,16.209476309,14.976542764,14.272644099,12.253991831,15.780574864,12.660619803,14.239605088,13.842160915,13.826679649,16.462518373,-5.521909512,-6.676290148,-2.378774016,-3.713330858,-6.199511554,-0.377928949,-5.885703436,-4.998558108,-5.64751704,-7.839294463,0,0,0.7319304666,0.1856665429,0.1878639865,0.1889644747,0.3797228024,0.3845044699,0.3894839338,0.3919647232,-9.440684004,-4.330566582,-16.28545288,-8.35499443,-5.823783581,0.1889644747,-3.797228024,-11.15062963,-4.673807205,4.8995590397,-9.440684004,-4.330566582,-15.55352242,-8.169327887,-5.635919594,0.3779289494,-3.417505221,-10.76612516,-4.284323272,5.2915237629 +050,2,4,29,007,Missouri,Audrain County,25529,25531,25453,25535,25539,25565,25841,25976,25863,25609,25411,24962,24835,-78,82,4,26,276,135,-113,-254,-198,-449,-127,91,362,339,337,345,349,326,344,336,309,306,103,278,290,302,277,301,317,294,336,297,297,-12,84,49,35,68,48,9,50,0,12,9,1,4,6,-1,1,10,2,3,2,0,0,-68,-5,-45,-6,211,78,-123,-308,-203,-462,-136,-67,-1,-39,-7,212,88,-121,-305,-201,-462,-136,1,-1,-6,-2,-4,-1,-1,1,3,1,0,2100,2100,2123,2218,2387,2338,2543,2472,2422,2313,1920,1791,14.199419471,13.274856091,13.188791484,13.422557678,13.47048266,12.577403113,13.366490519,13.17130537,12.26847716,12.289896982,10.904526555,11.356071582,11.819035692,10.776952107,11.617808827,12.230174193,11.423686665,13.17130537,11.792031445,11.928429423,3.294892916,1.9187845088,1.3697557921,2.6456055713,1.8526738329,0.3472289203,1.9428038545,0,0.476445715,0.3614675583,0.1568996627,0.2349532052,-0.03913588,0.0389059643,0.3859737152,0.0771619823,0.1165682313,0.0784006272,0,0,-0.196124578,-1.762149039,-0.234815279,8.209158464,3.0105949785,-4.745461911,-11.96767174,-7.957663661,-18.34316003,-5.462176436,-0.039224916,-1.527195833,-0.273951158,8.2480644283,3.3965686937,-4.668299929,-11.85110351,-7.879263034,-18.34316003,-5.462176436 +050,2,4,29,009,Missouri,Barry County,35597,35601,35555,35348,35334,35335,35327,35300,35204,35576,35687,35789,35818,-46,-207,-14,1,-8,-27,-96,372,111,102,29,95,422,433,403,403,401,424,459,404,410,402,124,398,391,407,395,421,430,420,465,429,415,-29,24,42,-4,8,-20,-6,39,-61,-19,-13,6,51,40,40,43,35,-15,-14,-16,-17,-11,-18,-282,-94,-33,-50,-37,-72,348,189,139,53,-12,-231,-54,7,-7,-2,-87,334,173,122,42,-5,0,-2,-2,-9,-5,-3,-1,-1,-1,0,296,296,296,296,296,295,296,296,296,296,296,296,11.90358659,12.252058516,11.405283788,11.406413631,11.355430643,12.027686372,12.96976547,11.338282138,11.472382338,11.227952574,11.226605362,11.063637135,11.518487597,11.179983584,11.921786286,12.197889481,11.867759254,13.050250481,12.004029325,11.591045568,0.6769812279,1.1884213803,-0.113203809,0.2264300473,-0.566355643,-0.170203109,1.1020062164,-1.711968343,-0.531646986,-0.363092994,1.4385851092,1.131829886,1.1320380931,1.2170615041,0.9911223753,-0.425507773,-0.395591975,-0.449040877,-0.475684146,-0.307232533,-7.954529428,-2.659800232,-0.933931427,-1.415187795,-1.04775794,-2.042437309,9.8332862391,5.3042953566,3.8894174268,1.4803022051,-6.515944318,-1.527970346,0.1981066663,-0.198126291,-0.056635564,-2.467945081,9.4376942639,4.8552544799,3.4137332811,1.173069672 +050,2,4,29,011,Missouri,Barton County,12402,12396,12384,12346,12299,12183,11990,11834,11834,11798,11756,11681,11592,-12,-38,-47,-116,-193,-156,0,-36,-42,-75,-89,25,147,150,143,147,135,144,126,135,127,127,19,129,138,148,160,152,156,128,140,126,146,6,18,12,-5,-13,-17,-12,-2,-5,1,-19,2,8,3,7,1,0,-2,-2,-2,-2,0,-21,-62,-65,-119,-184,-141,14,-32,-34,-74,-71,-19,-54,-62,-112,-183,-141,12,-34,-36,-76,-71,1,-2,3,1,3,2,0,0,-1,0,1,90,90,90,90,90,90,90,90,90,90,90,90,11.888394662,12.172854534,11.68205212,12.162329872,11.333109469,12.168328545,10.663507109,11.463021143,10.837564535,10.913934602,10.432672867,11.199026172,12.090515481,13.237910065,12.760241773,13.182355924,10.832769127,11.887577482,10.752229381,12.546727968,1.4557217954,0.9738283628,-0.408463361,-1.075580193,-1.427132304,-1.014027379,-0.169262018,-0.424556339,0.0853351538,-1.632793366,0.6469874646,0.2434570907,0.5718487052,0.0827369379,0,-0.169004563,-0.169262018,-0.169822535,-0.170670308,0,-5.014152851,-5.274903632,-9.721427988,-15.22359657,-11.83680322,1.1830319419,-2.708192282,-2.886983103,-6.314801382,-6.101490998,-4.367165386,-5.031446541,-9.149579283,-15.14085964,-11.83680322,1.0140273787,-2.877454299,-3.056805638,-6.48547169,-6.101490998 +050,2,4,29,013,Missouri,Bates County,17049,17047,17026,16965,16615,16425,16514,16361,16342,16294,16320,16213,16242,-21,-61,-350,-190,89,-153,-19,-48,26,-107,29,46,196,183,183,203,186,172,200,175,184,174,62,222,192,228,207,212,210,224,207,185,203,-16,-26,-9,-45,-4,-26,-38,-24,-32,-1,-29,1,5,3,0,1,0,1,3,0,2,3,-4,-41,-352,-147,91,-126,20,-27,58,-107,54,-3,-36,-349,-147,92,-126,21,-24,58,-105,57,-2,1,8,2,1,-1,-2,0,0,-1,1,311,311,311,311,311,311,311,311,311,311,311,311,11.532464476,10.899344848,11.07748184,12.325814384,11.315589354,10.518912638,12.256403971,10.731587662,11.311591307,10.7225389,13.062281192,11.435378201,13.801452785,12.568687574,12.897338403,12.842858453,13.727172448,12.69393512,11.373067347,12.509628717,-1.529816716,-0.536033353,-2.723970944,-0.24287319,-1.581749049,-2.323945815,-1.470768477,-1.962347458,-0.06147604,-1.787089817,0.2941955223,0.1786777844,0,0.0607182975,0,0.0611564688,0.1838460596,0,0.1229520794,0.1848713603,-2.412403283,-20.96486004,-8.898305085,5.5253650688,-7.66539924,1.2231293765,-1.654614536,3.5567547679,-6.577936249,3.3276844862,-2.118207761,-20.78618225,-8.898305085,5.5860833662,-7.66539924,1.2842858453,-1.470768477,3.5567547679,-6.45498417,3.5125558466 +050,2,4,29,015,Missouri,Benton County,19056,19070,19109,19046,19006,18960,18900,18815,18947,19097,19377,19477,19627,39,-63,-40,-46,-60,-85,132,150,280,100,150,46,179,129,141,151,171,152,177,189,160,170,53,257,280,282,282,309,310,309,299,328,330,-7,-78,-151,-141,-131,-138,-158,-132,-110,-168,-160,1,1,2,-1,2,1,-1,-1,-1,-1,-1,43,15,108,98,72,52,291,282,391,270,312,44,16,110,97,74,53,290,281,390,269,311,2,-1,1,-2,-3,0,0,1,0,-1,-1,244,244,244,244,244,244,244,244,244,244,244,244,9.3827807627,6.7801955219,7.427698467,7.9767564712,9.0680100756,8.0504210582,9.3050152455,9.8248167594,8.2359602615,8.6947626841,13.471366793,14.716703458,14.855396934,14.896988906,16.386053294,16.418621895,16.244348649,15.54296408,16.883718536,16.87806874,-4.088586031,-7.936507937,-7.427698467,-6.920232435,-7.318043219,-8.368200837,-6.939333403,-5.71814732,-8.647758275,-8.183306056,0.0524177696,0.1051193104,-0.052678713,0.1056524036,0.0530292987,-0.052963296,-0.052570708,-0.051983157,-0.051474752,-0.051145663,0.7862665444,5.6764427625,5.1625138282,3.8034865293,2.7575235318,15.412319263,14.824939544,20.325414566,13.898182941,15.957446809,0.838684314,5.781562073,5.1098351156,3.9091389329,2.8105528304,15.359355966,14.772368836,20.273431408,13.84670819,15.906301146 +050,2,4,29,017,Missouri,Bollinger County,12363,12365,12349,12382,12447,12487,12418,12320,12204,12281,12167,12142,12111,-16,33,65,40,-69,-98,-116,77,-114,-25,-31,31,144,160,120,137,134,119,110,147,137,141,24,136,125,124,146,141,120,151,163,126,141,7,8,35,-4,-9,-7,-1,-41,-16,11,0,0,0,0,0,0,0,0,1,1,1,1,-24,26,30,44,-60,-91,-114,118,-99,-37,-31,-24,26,30,44,-60,-91,-114,119,-98,-36,-30,1,-1,0,0,0,0,-1,-1,0,0,-1,163,163,163,163,163,163,164,163,163,163,163,163,11.645303465,12.88815498,9.6254110853,11.001806866,10.833535452,9.704778992,8.985092914,12.02552356,11.271545518,11.627427535,10.998342162,10.068871078,9.9462581214,11.724553303,11.399466408,9.7863317566,12.334082091,13.334424084,10.366530914,11.627427535,0.6469613036,2.8192839019,-0.320847036,-0.722746436,-0.565930956,-0.081552765,-3.348989177,-1.308900524,0.9050146036,0,0,0,0,0,0,0,0.0816826629,0.0818062827,0.0822740549,0.0824640251,2.1026242368,2.4165290588,3.5293173979,-4.818309576,-7.357102434,-9.297015169,9.6385542169,-8.09882199,-3.04414003,-2.556384777,2.1026242368,2.4165290588,3.5293173979,-4.818309576,-7.357102434,-9.297015169,9.7202368797,-8.017015707,-2.961865976,-2.473920752 +050,2,4,29,019,Missouri,Boone County,162642,162652,163208,166287,168868,171060,172920,174563,176579,178297,179569,181084,182991,556,3079,2581,2192,1860,1643,2016,1718,1272,1515,1907,494,2066,2117,2176,2190,2041,2129,2078,2075,2045,2059,295,942,951,1079,988,1114,950,1095,1189,1192,1245,199,1124,1166,1097,1202,927,1179,983,886,853,814,155,850,560,545,708,760,549,765,584,600,489,197,1097,838,551,-26,-28,288,-27,-201,56,589,352,1947,1398,1096,682,732,837,738,383,656,1078,5,8,17,-1,-24,-16,0,-3,3,6,15,8998,9000,8998,9000,9002,9008,9010,9016,9022,9032,9033,9035,12.540402738,12.632960869,12.802711162,12.733298448,11.74733728,12.126148396,11.711132903,11.596519368,11.34054063,11.31085628,5.7178409384,5.6749862004,6.3484031913,5.7445200302,6.4118244634,5.4109163814,6.171169648,6.6449453147,6.6102319959,6.8392501545,6.8225617991,6.9579746684,6.4543079711,6.9887784173,5.3355128165,6.7152320144,5.5399632548,4.9515740529,4.7303086346,4.4716061251,5.1594106132,3.3417374051,3.2065613895,4.1165184022,4.3743147147,3.1269400983,4.3113650965,3.263791475,3.3272979845,2.6862596992,6.6586746385,5.0006713312,3.2418629827,-0.15117158,-0.161158963,1.6403620188,-0.152165827,-1.123325491,0.3105478119,3.235597061,11.818085252,8.3424087363,6.4484243722,3.9653468225,4.2131557515,4.7673021171,4.1591992696,2.1404659845,3.6378457964,5.9218567603 +050,2,4,29,021,Missouri,Buchanan County,89201,89191,89071,89748,89962,89871,89649,89137,89072,88658,88047,87212,86530,-120,677,214,-91,-222,-512,-65,-414,-611,-835,-682,313,1215,1239,1138,1162,1164,1137,1164,1080,1098,1045,233,972,981,1005,940,984,892,958,1015,879,951,80,243,258,133,222,180,245,206,65,219,94,39,204,205,193,267,211,157,151,119,122,99,-250,231,-232,-411,-712,-905,-466,-772,-795,-1175,-872,-211,435,-27,-218,-445,-694,-309,-621,-676,-1053,-773,11,-1,-17,-6,1,2,-1,1,0,-1,-3,4487,4372,4446,4349,4409,4452,4468,4464,4396,4345,4322,4071,13.589159989,13.788882088,12.656186573,12.945632799,13.021153782,12.760298301,13.098520227,12.223762768,12.530026989,12.029330847,10.871327991,10.91758945,11.177036473,10.472370766,11.0075733,10.010717753,10.780397232,11.488073343,10.0308686,10.947266637,2.7178319977,2.8712926381,1.4791501004,2.4732620321,2.0135804817,2.7495805487,2.3181229956,0.7356894259,2.4991583884,1.0820642102,2.2816367388,2.2814534528,2.1464358599,2.9745989305,2.3603637869,1.7619761067,1.6992066618,1.3468775643,1.392225221,1.1396208171,2.5836180719,-2.581937566,-4.570907453,-7.932263815,-10.1238352,-5.229814431,-8.687334721,-8.998047593,-13.40872651,-10.03787225,4.8652548107,-0.300484113,-2.424471593,-4.957664884,-7.763471413,-3.467838325,-6.988128059,-7.651170029,-12.01650129,-8.89825143 +050,2,4,29,023,Missouri,Butler County,42794,42792,42785,42996,43001,42979,42870,42857,42804,42651,42641,42574,42178,-7,211,5,-22,-109,-13,-53,-153,-10,-67,-396,125,543,579,582,580,530,555,544,529,504,518,147,566,515,588,560,628,539,556,618,560,592,-22,-23,64,-6,20,-98,16,-12,-89,-56,-74,2,0,3,3,-3,13,5,5,-1,0,2,17,235,-51,-11,-118,78,-73,-145,82,-12,-322,19,235,-48,-8,-121,91,-68,-140,81,-12,-320,-4,-1,-11,-8,-8,-6,-1,-1,-2,1,-2,884,884,877,882,874,870,873,871,862,867,870,864,12.660146186,13.465586009,13.5380321,13.512096821,12.36483255,12.958055591,12.731847171,12.404445903,11.828903362,12.223900321,13.196395472,11.977161994,13.677599442,13.046162448,14.651160078,12.584490025,13.012696741,14.491394269,13.143225958,13.970171795,-0.536249286,1.4884240148,-0.139567341,0.4659343731,-2.286327528,0.3735655666,-0.28084957,-2.086948366,-1.314322596,-1.746271474,0,0.0697698757,0.0697836706,-0.069890156,0.3032883456,0.1167392396,0.1170206541,-0.023448858,0,0.0471965263,5.4790687915,-1.186087887,-0.255873459,-2.749012802,1.8197300734,-1.704392898,-3.39359897,1.9228063593,-0.281640556,-7.59864074,5.4790687915,-1.116318011,-0.186089788,-2.818902958,2.1230184189,-1.587653658,-3.276578316,1.8993575013,-0.281640556,-7.551444214 +050,2,4,29,025,Missouri,Caldwell County,9424,9418,9428,9276,9085,9036,8992,8996,9043,9056,9073,9039,9051,10,-152,-191,-49,-44,4,47,13,17,-34,12,23,89,90,85,88,93,112,93,99,100,100,12,97,112,105,111,101,102,90,122,96,104,11,-8,-22,-20,-23,-8,10,3,-23,4,-4,0,1,0,2,2,1,2,1,1,1,1,0,-147,-175,-33,-23,12,36,7,40,-38,15,0,-146,-175,-31,-21,13,38,8,41,-37,16,-1,2,6,2,0,-1,-1,2,-1,-1,0,214,214,214,214,214,214,214,214,214,214,214,214,9.5166809239,9.8033876151,9.3813807185,9.7625915243,10.340226818,12.417539775,10.276810874,10.921727619,11.042402827,11.055831951,10.372112917,12.199771254,11.588764417,12.314177945,11.229708695,11.308830866,9.9453008454,13.459098682,10.600706714,11.498065229,-0.855431993,-2.396383639,-2.207383698,-2.551586421,-0.889481877,1.1087089085,0.3315100282,-2.537371063,0.4416961131,-0.442233278,0.1069289991,0,0.2207383698,0.2218770801,0.1111852346,0.2217417817,0.1105033427,0.110320481,0.1104240283,0.1105583195,-15.71856287,-19.06214258,-3.642183102,-2.551586421,1.3342228152,3.9913520705,0.7735233991,4.4128192399,-4.196113074,1.6583747927,-15.61163388,-19.06214258,-3.421444733,-2.329709341,1.4454080498,4.2130938522,0.8840267418,4.5231397209,-4.085689046,1.7689331122 +050,2,4,29,027,Missouri,Callaway County,44332,44331,44312,44311,44413,44546,44651,44722,45082,45002,44987,44762,44887,-19,-1,102,133,105,71,360,-80,-15,-225,125,123,498,507,526,536,516,469,473,470,509,491,129,346,385,350,336,396,384,406,428,431,454,-6,152,122,176,200,120,85,67,42,78,37,8,63,40,28,8,24,14,18,13,14,11,-20,-217,-56,-68,-94,-69,263,-164,-70,-317,76,-12,-154,-16,-40,-86,-45,277,-146,-57,-303,87,-1,1,-4,-3,-9,-4,-2,-1,0,0,1,3907,3857,3747,3819,3749,3802,3879,4015,3891,3681,3614,3622,11.238617515,11.428700239,11.825672501,12.018341424,11.547111544,10.444969044,10.501309889,10.445721144,11.342744766,10.953831052,7.8083567471,8.6785988008,7.8687934891,7.5338856688,8.8617367661,8.5519575965,9.0138093335,9.5122737223,9.6045638392,10.128389608,3.4302607675,2.7501014382,3.9568790117,4.4844557552,2.6853747776,1.8930114472,1.487500555,0.9334474214,1.7381809268,0.8254414439,1.4217528181,0.9016726027,0.6295034791,0.1793782302,0.5370749555,0.3117901207,0.3996270148,0.2889242018,0.311981192,0.2454015103,-4.897148596,-1.262341644,-1.528794164,-2.107694205,-1.544090497,5.8572001247,-3.641046135,-1.555745702,-7.064145562,1.6955013441,-3.475395778,-0.360669041,-0.899290684,-1.928315975,-1.007015542,6.1689902454,-3.24141912,-1.2668215,-6.75216437,1.9409028545 +050,2,4,29,029,Missouri,Camden County,44002,44033,44096,43851,44232,44334,44601,44793,44979,45554,45956,46211,46414,63,-245,381,102,267,192,186,575,402,255,203,98,447,398,396,411,416,410,391,385,370,360,80,443,469,433,494,476,504,491,506,510,582,18,4,-71,-37,-83,-60,-94,-100,-121,-140,-222,5,26,32,18,14,22,7,8,9,-8,-1,44,-274,411,120,326,228,273,666,514,406,429,49,-248,443,138,340,250,280,674,523,398,428,-4,-1,9,1,10,2,0,1,0,-3,-3,774,774,774,774,774,774,774,774,774,774,774,774,10.16521314,9.0369310764,8.9424835716,9.2427053466,9.3071123342,9.1342512142,8.6377343068,8.414380942,8.0289040546,7.7732793522,10.074249264,10.649046922,9.7780186528,11.109237083,10.649484305,11.228445395,10.846873516,11.058900667,11.066867751,12.566801619,0.090963876,-1.612115845,-0.835535081,-1.866531737,-1.342371971,-2.094194181,-2.209139209,-2.644519725,-3.037963696,-4.793522267,0.5912651938,0.7265874232,0.406476526,0.3148366785,0.4922030561,0.1559506305,0.1767311367,0.1966998142,-0.173597926,-0.021592443,-6.231025504,9.3321072171,2.7098435065,7.3311969416,5.1010134908,6.082074589,14.712867131,11.233744946,8.8100947194,9.2631578947,-5.63976031,10.05869464,3.1163200325,7.6460336201,5.593216547,6.2380252194,14.889598268,11.43044476,8.6364967939,9.2415654521 +050,2,4,29,031,Missouri,Cape Girardeau County,75674,75676,75905,76627,77076,77495,77950,78297,78540,78338,78810,78971,79512,229,722,449,419,455,347,243,-202,472,161,541,230,901,937,924,893,909,919,915,911,877,879,138,787,711,745,720,790,815,819,779,823,811,92,114,226,179,173,119,104,96,132,54,68,22,151,123,103,137,196,139,173,125,134,115,115,458,117,150,159,38,3,-473,218,-30,354,137,609,240,253,296,234,142,-300,343,104,469,0,-1,-17,-13,-14,-6,-3,2,-3,3,4,3823,3822,3823,3823,3827,3829,3832,3833,3835,3841,3839,3827,11.813914457,12.192344977,11.955670857,11.48959439,11.6354234,11.719173409,11.665115568,11.594166009,11.116674378,11.0926724,10.319146146,9.2516086218,9.6395831042,9.2637267201,10.112194154,10.392955744,10.44123459,9.9142209891,10.432181315,10.234536196,1.4947683109,2.9407363552,2.3160877526,2.2258676702,1.523229246,1.3262176655,1.2238809776,1.67994502,0.6844930632,0.8581362039,1.9799124118,1.6004892553,1.3327208855,1.7626813342,2.5088481699,1.7725409183,2.2055355117,1.5908570265,1.6985568605,1.4512597566,6.0052972491,1.5224166087,1.9408556586,2.0457396507,0.4864093391,0.0382562788,-6.030163567,2.7744546542,-0.380273924,4.4673561202,7.9852096609,3.1229058639,3.2735765441,3.8084209849,2.9952575089,1.8107971971,-3.824628055,4.3653116807,1.3182829365,5.9186158768 +050,2,4,29,033,Missouri,Carroll County,9295,9294,9282,9252,9076,9054,8958,8882,8849,8789,8724,8698,8554,-12,-30,-176,-22,-96,-76,-33,-60,-65,-26,-144,34,103,115,117,114,94,98,82,94,86,86,40,123,117,142,112,113,116,108,123,103,115,-6,-20,-2,-25,2,-19,-18,-26,-29,-17,-29,3,8,3,1,3,2,2,4,3,4,2,-8,-17,-183,3,-103,-57,-16,-38,-38,-14,-115,-5,-9,-180,4,-100,-55,-14,-34,-35,-10,-113,-1,-1,6,-1,2,-2,-1,0,-1,1,-2,88,88,88,88,88,88,88,88,88,88,88,88,11.114708104,12.549105194,12.906784335,12.658227848,10.538116592,11.054086064,9.2981063613,10.734882659,9.8725749053,9.9698585671,13.272903852,12.767350502,15.664644236,12.436153675,12.668161435,13.084428402,12.246286427,14.04670816,11.82413041,13.331787619,-2.158195748,-0.218245308,-2.757859901,0.2220741728,-2.130044843,-2.030342338,-2.948180066,-3.311825501,-1.951555505,-3.361929052,0.8632782993,0.3273679616,0.110314396,0.3331112592,0.2242152466,0.2255935931,0.453566164,0.342602638,0.4591895305,0.231857176,-1.834466386,-19.96944566,0.3309431881,-11.4368199,-6.390134529,-1.804748745,-4.308878558,-4.339633415,-1.607163357,-13.33178762,-0.971188087,-19.6420777,0.4412575841,-11.10370864,-6.165919283,-1.579155152,-3.855312394,-3.997030777,-1.147973826,-13.09993044 +050,2,4,29,035,Missouri,Carter County,6265,6265,6292,6330,6271,6342,6286,6280,6210,6177,6068,5981,5991,27,38,-59,71,-56,-6,-70,-33,-109,-87,10,20,73,66,90,79,78,80,73,76,77,72,23,85,82,55,69,69,87,82,79,90,92,-3,-12,-16,35,10,9,-7,-9,-3,-13,-20,0,-1,-1,0,0,0,0,0,0,0,0,27,52,-42,35,-67,-14,-62,-24,-106,-74,32,27,51,-43,35,-67,-14,-62,-24,-106,-74,32,3,-1,0,1,1,-1,-1,0,0,0,-2,40,40,40,40,40,40,40,40,40,40,40,40,11.567105055,10.475359098,14.270990248,12.511878366,12.414451695,12.810248199,11.786550416,12.41322989,12.781143663,12.028065486,13.468546981,13.014840092,8.7211607072,10.928096294,10.982014961,13.931144916,13.239686768,12.903225806,14.938999087,15.369194788,-1.901441927,-2.539480994,5.5498295409,1.5837820716,1.432436734,-1.120896717,-1.453136353,-0.489995917,-2.157855424,-3.341129302,-0.158453494,-0.158717562,0,0,0,0,0,0,0,0,8.2395816828,-6.666137608,5.5498295409,-10.61133988,-2.22823492,-9.927942354,-3.875030274,-17.31318906,-12.28317703,5.3458068827,8.0811281889,-6.82485517,5.5498295409,-10.61133988,-2.22823492,-9.927942354,-3.875030274,-17.31318906,-12.28317703,5.3458068827 +050,2,4,29,037,Missouri,Cass County,99478,99500,99756,100017,100458,100712,100872,101389,102645,103502,104753,105731,106806,256,261,441,254,160,517,1256,857,1251,978,1075,354,1205,1203,1202,1173,1156,1153,1172,1185,1146,1155,235,828,865,944,904,910,919,961,986,1025,1079,119,377,338,258,269,246,234,211,199,121,76,8,61,35,50,25,48,0,2,-13,-8,-4,136,-176,86,-39,-128,236,1025,651,1067,869,1004,144,-115,121,11,-103,284,1025,653,1054,861,1000,-7,-1,-18,-15,-6,-13,-3,-7,-2,-4,-1,1044,1044,1044,1044,1044,1044,1045,1044,1045,1045,1045,1045,12.063692291,12.001496446,11.950091962,11.637828399,11.430775088,11.302037896,11.370526857,11.380278985,10.889188727,10.868695804,8.2894084786,8.6295049258,9.3850971815,8.9689657909,8.9982745067,9.0083025378,9.3234439502,9.4691604043,9.739457631,10.15352621,3.7742838121,3.3719915201,2.5649947805,2.6688626081,2.4325005809,2.2937353578,2.0470829069,1.9111185806,1.149731096,0.715169594,0.6106931367,0.3491707195,0.4970920117,0.2480355584,0.4746342597,0,0.0194036294,-0.124846942,-0.076015279,-0.037640505,-1.76199987,0.8579623394,-0.387731769,-1.269942059,2.3336184435,10.04734505,6.3158813856,10.247052892,8.2571596891,9.4477667418,-1.151306733,1.207133059,0.1093602426,-1.021906501,2.8082527032,10.04734505,6.3352850151,10.122205949,8.18114441,9.4101262368 +050,2,4,29,039,Missouri,Cedar County,13982,13982,13969,13914,13910,13776,13788,13790,13884,14086,14126,14301,14322,-13,-55,-4,-134,12,2,94,202,40,175,21,36,144,177,172,174,176,188,201,173,191,194,68,187,185,196,203,210,216,208,215,205,224,-32,-43,-8,-24,-29,-34,-28,-7,-42,-14,-30,0,0,0,1,0,0,0,1,1,1,1,20,-11,6,-110,42,37,123,208,82,188,50,20,-11,6,-109,42,37,123,209,83,189,51,-1,-1,-2,-1,-1,-1,-1,0,-1,0,0,156,156,156,156,156,156,156,156,156,156,156,156,10.328874224,12.722829212,12.425052373,12.625163256,12.76379723,13.586760136,14.372542009,12.264284702,13.43792873,13.555532264,13.413190833,13.29787234,14.158780611,14.729357132,15.229530785,15.610320156,14.873078298,15.241741103,14.422907799,15.651748594,-3.084316609,-0.575043128,-1.733728238,-2.104193876,-2.465733556,-2.02356002,-0.500536289,-2.977456402,-0.984979069,-2.09621633,0,0,0.0722386766,0,0,0,0.0715051841,0.0708918191,0.0703556478,0.0698738777,-0.789011225,0.4312823462,-7.946254425,3.0474531998,2.6832982812,8.8892100889,14.873078298,5.8131291649,13.226861786,3.4936938825,-0.789011225,0.4312823462,-7.874015748,3.0474531998,2.6832982812,8.8892100889,14.944583482,5.884020984,13.297217434,3.5635677602 +050,2,4,29,041,Missouri,Chariton County,7831,7816,7836,7744,7680,7640,7676,7582,7512,7462,7449,7463,7360,20,-92,-64,-40,36,-94,-70,-50,-13,14,-103,18,81,80,90,102,74,90,90,80,95,90,11,93,97,75,96,121,83,107,102,81,103,7,-12,-17,15,6,-47,7,-17,-22,14,-13,1,3,2,2,0,0,0,0,0,0,0,13,-84,-50,-58,31,-47,-78,-32,11,-1,-89,14,-81,-48,-56,31,-47,-78,-32,11,-1,-89,-1,1,1,1,-1,0,1,-1,-2,1,-1,213,213,213,213,213,213,213,213,213,213,213,213,10.397946085,10.373443983,11.749347258,13.319404544,9.6998295976,11.925268319,12.020836116,10.730333311,12.741416309,12.143290832,11.938382542,12.57780083,9.7911227154,12.535910159,15.86053218,10.997747449,14.291438493,13.681174971,10.863733906,13.89732173,-1.540436457,-2.204356846,1.9582245431,0.783494385,-6.160702582,0.9275208692,-2.270602377,-2.950841661,1.8776824034,-1.754030898,0.3851091142,0.2593360996,0.2610966057,0,0,0,0,0,0,0,-10.7830552,-6.48340249,-7.571801567,4.0480543223,-6.160702582,-10.33523254,-4.274075063,1.4754208303,-0.134120172,-12.00836538,-10.39794608,-6.22406639,-7.310704961,4.0480543223,-6.160702582,-10.33523254,-4.274075063,1.4754208303,-0.134120172,-12.00836538 +050,2,4,29,043,Missouri,Christian County,77422,77414,77841,78664,79695,80675,81887,83154,84271,85533,87248,88913,90655,427,823,1031,980,1212,1267,1117,1262,1715,1665,1742,257,1069,952,990,969,1071,1038,1019,1017,1083,1062,110,517,537,579,600,666,600,665,711,685,759,147,552,415,411,369,405,438,354,306,398,303,4,21,2,6,9,26,21,75,60,69,55,258,252,616,561,827,835,660,834,1351,1201,1388,262,273,618,567,836,861,681,909,1411,1270,1443,18,-2,-2,2,7,1,-2,-1,-2,-3,-4,582,582,582,582,582,582,582,582,582,582,582,582,13.660905402,12.023314115,12.346448837,11.921605295,12.978593198,12.399581902,12.002072978,11.772127722,12.295570529,11.828388132,6.6068176736,6.7820584874,7.2208018956,7.3817989444,8.0707218206,7.1673883829,7.8325598926,8.2300715935,7.7769767429,8.4536220262,7.0540877288,5.241255628,5.1256469414,4.5398063508,4.9078713774,5.2321935195,4.1695130857,3.5420561289,4.5185937864,3.3747661053,0.2683620332,0.0252590633,0.0748269626,0.1107269842,0.3150732242,0.2508585934,0.8833714165,0.6945208096,0.7833742996,0.6125813062,3.2203443979,7.7797914864,6.9963210077,10.174579545,10.118697778,7.8841272211,9.823090151,15.638293562,13.635254114,15.459324601,3.4887064311,7.8050505497,7.0711479703,10.285306529,10.433771002,8.1349858145,10.706461567,16.332814372,14.418628414,16.071905908 +050,2,4,29,045,Missouri,Clark County,7139,7132,7139,7028,6968,6901,6889,6811,6734,6719,6827,6804,6830,7,-111,-60,-67,-12,-78,-77,-15,108,-23,26,16,73,85,86,72,86,76,69,85,68,73,12,81,86,102,84,96,89,73,82,63,73,4,-8,-1,-16,-12,-10,-13,-4,3,5,0,0,1,1,0,3,5,1,6,4,6,3,2,-104,-63,-51,-1,-75,-65,-16,102,-35,23,2,-103,-62,-51,2,-70,-64,-10,106,-29,26,1,0,3,0,-2,2,0,-1,-1,1,0,90,90,90,90,90,90,90,90,90,90,90,90,10.305639867,12.146327522,12.401759319,10.442349529,12.554744526,11.221853082,10.257935033,12.549830208,9.9772577214,10.708522811,11.435025058,12.289225493,14.709063379,12.182741117,14.01459854,13.141380583,10.852597934,12.106895024,9.2436358301,10.708522811,-1.129385191,-0.142897971,-2.307304059,-1.740391588,-1.459854015,-1.919527501,-0.5946629,0.4429351838,0.7336218913,0,0.1411731489,0.1428979708,0,0.435097897,0.7299270073,0.1476559616,0.8919943507,0.5905802451,0.8803462695,0.4400762799,-14.68200748,-9.002572163,-7.354531689,-0.145032632,-10.94890511,-9.597637505,-2.378651602,15.05979625,-5.135353239,3.3739181458,-14.54083433,-8.859674193,-7.354531689,0.2900652647,-10.2189781,-9.449981543,-1.486657251,15.650376495,-4.255006969,3.8139944257 +050,2,4,29,047,Missouri,Clay County,221939,221905,222649,225271,227636,230401,233142,235344,238837,242780,246798,250522,253463,744,2622,2365,2765,2741,2202,3493,3943,4018,3724,2941,782,3070,2993,3134,3040,3110,3057,2945,3176,3069,3118,381,1556,1570,1640,1634,1811,1697,1802,1838,1850,2000,401,1514,1423,1494,1406,1299,1360,1143,1338,1219,1118,88,340,215,154,205,252,138,210,117,139,130,253,771,743,1130,1142,670,1993,2577,2559,2365,1687,341,1111,958,1284,1347,922,2131,2787,2676,2504,1817,2,-3,-16,-13,-12,-19,2,13,4,1,6,2646,2645,2643,2644,2645,2647,2651,2653,2653,2653,2656,2657,13.707804965,13.216841427,13.684484005,13.116366766,13.276810833,12.893810591,12.229634751,12.974439211,12.342153945,12.373384128,6.9476692266,6.9329906581,7.1609935442,7.0500471369,7.7312875945,7.1576043747,7.4831245575,7.5085073267,7.4398777447,7.9367441491,6.7601357385,6.2838507685,6.5234904604,6.0663196295,5.5455232387,5.7362062166,4.7465101938,5.4659318842,4.9022762004,4.4366399794,1.5181282372,0.9494222876,0.6724347596,0.8844918379,1.0758058939,0.582056219,0.8720622403,0.4779626536,0.5589962197,0.5158883697,3.442579032,3.2810267892,4.9340992103,4.9272667261,2.860277575,8.4060727866,10.701449492,10.453901115,9.5109788466,6.6946436898,4.9607072692,4.2304490767,5.60653397,5.8117585639,3.9360834689,8.9881290056,11.573511732,10.931863768,10.069975066,7.2105320595 +050,2,4,29,049,Missouri,Clinton County,20743,20742,20740,20679,20560,20569,20270,20592,20535,20558,20435,20434,20553,-2,-61,-119,9,-299,322,-57,23,-123,-1,119,43,243,223,234,210,235,215,251,232,230,227,31,257,258,218,280,258,248,261,277,226,243,12,-14,-35,16,-70,-23,-33,-10,-45,4,-16,0,-5,-6,-3,-4,0,-2,-2,-2,-2,-1,-12,-42,-81,-3,-228,345,-22,37,-78,-2,135,-12,-47,-87,-6,-232,345,-24,35,-80,-4,134,-2,0,3,-1,3,0,0,-2,2,-1,1,445,445,445,445,445,445,445,446,445,445,432,424,11.733745383,10.815005214,11.378832454,10.284287079,11.502129118,10.455418581,12.216192539,11.319005684,11.25547481,11.076682851,12.409763635,12.512427556,10.600792628,13.712382771,12.627869414,12.060203759,12.702893437,13.514502476,11.059727422,11.857418206,-0.676018252,-1.697422343,0.7780398259,-3.428095693,-1.125740297,-1.604785178,-0.486700898,-2.195496792,0.195747388,-0.780735355,-0.24143509,-0.290986687,-0.145882467,-0.195891182,0,-0.097259708,-0.09734018,-0.097577635,-0.097873694,-0.04879596,-2.028054757,-3.928320279,-0.145882467,-11.1657974,16.886104449,-1.069856785,1.8007933225,-3.805527773,-0.097873694,6.5874545588,-2.269489848,-4.219306967,-0.291764935,-11.36168858,16.886104449,-1.167116493,1.7034531429,-3.903105408,-0.195747388,6.5386585991 +050,2,4,29,051,Missouri,Cole County,75990,75970,76145,76490,76480,76732,76656,76838,76748,76702,76734,76774,76191,175,345,-10,252,-76,182,-90,-46,32,40,-583,234,939,893,969,916,957,915,863,886,885,861,117,615,590,656,638,638,661,624,720,691,757,117,324,303,313,278,319,254,239,166,194,104,18,66,86,60,84,88,84,106,81,92,73,48,-44,-397,-108,-439,-219,-430,-391,-214,-248,-756,66,22,-311,-48,-355,-131,-346,-285,-133,-156,-683,-8,-1,-2,-13,1,-6,2,0,-1,2,-4,4968,4968,4970,4938,4996,4945,4985,4936,4929,4914,4919,4239,12.303862155,11.675491927,12.649139754,11.943567945,12.469542783,11.915148516,11.247963506,11.548789072,11.530343695,11.257477201,8.0584400694,7.7139308361,8.563297914,8.3187733069,8.3130285223,8.6075553761,8.1329423265,9.3850204646,9.0027881283,9.8976890138,4.2454220854,3.9615610904,4.0858418401,3.6247946384,4.1565142611,3.30759314,3.1150211795,2.1637686071,2.5275555671,1.3597881868,0.8648082026,1.1244034778,0.7832284677,1.0952616893,1.1466246238,1.0938496998,1.3815575106,1.0558148023,1.1986345988,0.9544667081,-0.576538802,-5.190560241,-1.409811242,-5.72404621,-2.853531734,-5.599468702,-5.096122515,-2.789436638,-3.231101962,-9.884614127,0.2882694009,-4.066156763,-0.626582774,-4.62878452,-1.70690711,-4.505619002,-3.714565005,-1.733621836,-2.032467363,-8.930147419 +050,2,4,29,053,Missouri,Cooper County,17601,17602,17601,17551,17538,17612,17564,17615,17697,17642,17604,17563,17102,-1,-50,-13,74,-48,51,82,-55,-38,-41,-461,45,198,198,189,209,195,178,188,214,205,204,29,186,202,176,190,200,207,200,192,178,198,16,12,-4,13,19,-5,-29,-12,22,27,6,2,5,2,1,10,16,12,4,2,2,2,-20,-67,-6,61,-73,41,100,-47,-63,-67,-467,-18,-62,-4,62,-63,57,112,-43,-61,-65,-465,1,0,-5,-1,-4,-1,-1,0,1,-3,-2,1533,1517,1402,1487,1476,1542,1547,1523,1544,1540,1415,982,11.265361857,11.285588076,10.753911807,11.883102115,11.086159356,10.081558677,10.63980305,12.143221926,11.658657264,11.769796625,10.582612654,11.513579754,10.014224751,10.802820105,11.370419853,11.72405981,11.318939415,10.894853317,10.123126795,11.423626136,0.6827492035,-0.227991678,0.7396870555,1.0802820105,-0.284260496,-1.642501133,-0.679136365,1.2483686092,1.5355304689,0.346170489,0.2844788348,0.1139958392,0.0568990043,0.5685694792,0.9096335882,0.6796556411,0.2263787883,0.1134880554,0.1137429977,0.115390163,-3.812016386,-0.341987517,3.4708392603,-4.150557198,2.3309360698,5.6637970095,-2.659950763,-3.574873745,-3.810390423,-26.94360306,-3.527537551,-0.227991678,3.5277382646,-3.581987719,3.240569658,6.3434526507,-2.433571974,-3.461385689,-3.696647425,-26.82821289 +050,2,4,29,055,Missouri,Crawford County,24696,24720,24631,24817,24783,24530,24633,24510,24269,24109,23948,23856,23739,-89,186,-34,-253,103,-123,-241,-160,-161,-92,-117,68,287,258,297,316,298,276,253,267,252,254,101,266,296,277,283,286,295,325,326,301,332,-33,21,-38,20,33,12,-19,-72,-59,-49,-78,0,0,0,-4,-4,-3,-3,-2,-4,-2,-4,-55,164,10,-272,78,-132,-219,-85,-98,-41,-34,-55,164,10,-276,74,-135,-222,-87,-102,-43,-38,-1,1,-6,3,-4,0,0,-1,0,0,-1,332,332,332,332,332,332,332,332,332,332,332,332,11.60815402,10.403225806,12.045505242,12.855195981,12.127871721,11.316345149,10.459299682,11.111804732,10.543050791,10.673390062,10.758776897,11.935483871,11.234360108,11.512722983,11.639501048,12.095368909,13.435859275,13.567222257,12.593088444,13.951045278,0.8493771234,-1.532258065,0.8111451341,1.342472998,0.4883706733,-0.77902376,-2.976559593,-2.455417525,-2.050037654,-3.277655216,0,0,-0.162229027,-0.162724,-0.122092668,-0.123003752,-0.082682211,-0.166468985,-0.083675006,-0.168084883,6.6332308688,0.4032258065,-11.03157382,3.1731179952,-5.372077407,-8.979273868,-3.513993964,-4.078490126,-1.715337629,-1.428721504,6.6332308688,0.4032258065,-11.19380285,3.0103939955,-5.494170075,-9.102277619,-3.596676175,-4.244959111,-1.799012635,-1.596806387 +050,2,4,29,057,Missouri,Dade County,7883,7879,7839,7765,7556,7531,7597,7576,7598,7583,7560,7547,7568,-40,-74,-209,-25,66,-21,22,-15,-23,-13,21,15,70,70,67,57,76,64,74,66,75,70,42,103,95,90,95,115,111,106,100,116,115,-27,-33,-25,-23,-38,-39,-47,-32,-34,-41,-45,0,0,0,1,3,6,3,2,2,1,2,-13,-40,-191,-3,98,14,65,18,9,28,65,-13,-40,-191,-2,101,20,68,20,11,29,67,0,-1,7,0,3,-2,1,-3,0,-1,-1,133,133,133,133,133,133,133,133,133,133,133,133,8.9720584466,9.1377847399,8.8818187844,7.5356953993,10.017794767,8.4354817451,9.7490283908,8.7168988972,9.9291719071,9.2623221965,13.201743143,12.40127929,11.930801352,12.559492332,15.15850524,14.630288652,13.964824452,13.207422571,15.357119216,15.21667218,-4.229684696,-3.26349455,-3.048982568,-5.023796933,-5.140710473,-6.194806907,-4.215796061,-4.490523674,-5.427947309,-5.954349983,0,0,0.1325644595,0.3966155473,0.7908785342,0.3954132068,0.2634872538,0.2641484514,0.1323889588,0.264637777,-5.126890541,-24.93309836,-0.397693378,12.956107879,1.8453832466,8.5672861474,2.3713852842,1.1886680314,3.7068908453,8.6007277539,-5.126890541,-24.93309836,-0.265128919,13.352723427,2.6362617808,8.9626993542,2.634872538,1.4528164829,3.8392798041,8.8653655309 +050,2,4,29,059,Missouri,Dallas County,16777,16769,16723,16689,16703,16468,16349,16362,16418,16755,16828,16984,17219,-46,-34,14,-235,-119,13,56,337,73,156,235,46,190,211,199,191,200,227,220,206,232,233,60,182,141,185,188,199,209,210,206,196,231,-14,8,70,14,3,1,18,10,0,36,2,0,-1,-2,-4,-2,3,14,25,19,20,15,-32,-39,-57,-249,-120,10,25,302,53,102,219,-32,-40,-59,-253,-122,13,39,327,72,122,234,0,-2,3,4,0,-1,-1,0,1,-2,-1,199,199,199,199,199,199,199,199,199,199,199,199,11.373159344,12.637757547,11.998432366,11.640308377,12.228302406,13.849908481,13.263798873,12.268111842,13.722938602,13.624535859,10.894289477,8.4451365597,11.154321546,11.457476308,12.167160894,12.751677852,12.660898924,12.268111842,11.593517095,13.507587054,0.4788698671,4.1926209871,0.8441108197,0.1828320687,0.061141512,1.0982306284,0.6028999488,0,2.1294215072,0.1169488057,-0.059858733,-0.119789171,-0.24117452,-0.121888046,0.1834245361,0.8541793777,1.5072498719,1.1315248787,1.1830119484,0.8771160425,-2.334490602,-3.413991375,-15.01311386,-7.31328275,0.6114151203,1.5253203173,18.207578452,3.156358872,6.0333609369,12.80589422,-2.394349336,-3.533780546,-15.25428838,-7.435170796,0.7948396564,2.3794996949,19.714828324,4.2878837507,7.2163728854,13.683010262 +050,2,4,29,061,Missouri,Daviess County,8433,8424,8444,8289,8294,8295,8317,8281,8227,8355,8330,8273,8283,20,-155,5,1,22,-36,-54,128,-25,-57,10,23,118,115,103,124,124,117,108,123,127,124,10,92,78,105,86,97,99,84,88,75,93,13,26,37,-2,38,27,18,24,35,52,31,0,1,1,1,1,5,0,0,0,0,0,8,-182,-31,4,-17,-69,-73,104,-61,-109,-20,8,-181,-30,5,-16,-64,-73,104,-61,-109,-20,-1,0,-2,-2,0,1,1,0,1,0,-1,152,152,152,152,152,152,152,152,152,152,152,152,14.103866611,13.86962552,12.417867261,14.928967012,14.941559224,14.174945481,13.026172959,14.74378184,15.298440041,14.979463639,10.996234985,9.4072242658,12.658990898,10.353960992,11.688155199,11.994184638,10.131467857,10.548396764,9.0345118352,11.234597729,3.1076316261,4.4624012543,-0.241123636,4.5750060197,3.2534040246,2.1807608432,2.8947051019,4.1953850764,6.2639282057,3.7448659096,0.1195242933,0.1206054393,0.1205618181,0.1203948953,0.6024822268,0,0,0,0,0,-21.75342138,-3.738768618,0.4822472723,-2.046713219,-8.314254729,-8.844196753,12.543722108,-7.311956847,-13.1301572,-2.416042522,-21.63389709,-3.618163179,0.6028090904,-1.926318324,-7.711772503,-8.844196753,12.543722108,-7.311956847,-13.1301572,-2.416042522 +050,2,4,29,063,Missouri,DeKalb County,12892,12888,12899,12817,12783,12638,12556,12559,12520,12561,12534,10802,10944,11,-82,-34,-145,-82,3,-39,41,-27,-1732,142,23,116,107,98,116,106,123,94,107,92,92,17,134,117,136,114,117,121,115,147,120,95,6,-18,-10,-38,2,-11,2,-21,-40,-28,-3,3,6,1,-3,0,-5,-2,1,1,1,1,2,-69,-27,-104,-85,20,-39,61,14,-1708,145,5,-63,-26,-107,-85,15,-41,62,15,-1707,146,0,-1,2,0,1,-1,0,0,-2,3,-1,3560,3560,3560,3545,3538,3534,3543,3500,3509,3458,1682,1851,9.0216207808,8.359375,7.7101608906,9.2085417163,8.4411706152,9.8090035488,7.495713887,8.5275951385,7.8848131642,8.4613262209,10.421527454,9.140625,10.699815113,9.0497737557,9.3171411507,9.6495075561,9.170288266,11.715481172,10.28453891,8.7372390325,-1.399906673,-0.78125,-2.989654223,0.1587679606,-0.875970536,0.1594959927,-1.674574379,-3.187886033,-2.399725746,-0.275912812,0.4666355576,0.078125,-0.236025333,0,-0.398168425,-0.159495993,0.0797416371,0.0796971508,0.0857044909,0.0919709372,-5.366308913,-2.109375,-8.182211557,-6.747638327,1.592673701,-3.110171857,4.8642398628,1.1157601116,-146.3832705,13.335785892,-4.899673355,-2.03125,-8.418236891,-6.747638327,1.1945052757,-3.26966785,4.9439814999,1.1954572624,-146.297566,13.427756829 +050,2,4,29,065,Missouri,Dent County,15657,15692,15739,15620,15659,15745,15641,15662,15457,15510,15592,15548,15481,47,-119,39,86,-104,21,-205,53,82,-44,-67,46,160,163,182,179,196,182,178,195,142,161,29,205,186,189,173,221,191,204,181,200,229,17,-45,-23,-7,6,-25,-9,-26,14,-58,-68,5,0,6,6,10,9,9,11,7,9,6,25,-75,58,89,-120,40,-206,68,64,5,-6,30,-75,64,95,-110,49,-197,79,71,14,0,0,1,-2,-2,0,-3,1,0,-3,0,1,202,202,202,202,202,202,201,201,201,201,201,201,10.204407028,10.42232808,11.590880143,11.406359523,12.522761397,11.697033966,11.496108761,12.539386535,9.1201027617,10.377388894,13.074396505,11.89296333,12.036683225,11.02402345,14.120052391,12.275458723,13.175315659,11.639122886,12.845215157,14.760385446,-2.869989477,-1.47063525,-0.445803082,0.3823360734,-1.597290994,-0.578424757,-1.679206898,0.9002636486,-3.725112396,-4.382996552,0,0.3836439784,0.3821169278,0.637226789,0.575024758,0.5784247566,0.7104336875,0.4501318243,0.5780346821,0.3867349898,-4.783315795,3.7085584578,5.6680677621,-7.646721468,2.5556655912,-13.23949998,4.3917718862,4.1154909652,0.3211303789,-0.38673499,-4.783315795,4.0922024361,6.0501846898,-7.009494679,3.1306903492,-12.66107523,5.1022055737,4.5656227895,0.899165061,0 +050,2,4,29,067,Missouri,Douglas County,13684,13686,13652,13636,13582,13449,13533,13374,13368,13301,13416,13248,13344,-34,-16,-54,-133,84,-159,-6,-67,115,-168,96,35,144,160,149,135,164,147,155,153,148,134,22,156,143,173,173,157,185,171,201,182,179,13,-12,17,-24,-38,7,-38,-16,-48,-34,-45,0,-1,-3,-3,0,-3,-4,-4,-4,-4,-2,-47,-2,-66,-107,122,-165,37,-46,168,-130,143,-47,-3,-69,-110,122,-168,33,-50,164,-134,141,0,-1,-2,1,0,2,-1,-1,-1,0,0,123,123,123,123,123,123,123,123,123,123,123,123,10.55408971,11.756925564,11.024379416,10.006671114,12.190136396,10.993942114,11.623982901,11.453381742,11.101110111,10.078219013,11.433597186,10.507752223,12.800118383,12.823363724,11.669825696,13.835913544,12.823877911,15.046599543,13.651365137,13.462695548,-0.879507476,1.2491733412,-1.775738966,-2.81669261,0.5203106998,-2.841971431,-1.199895009,-3.593217801,-2.550255026,-3.384476534,-0.07329229,-0.220442354,-0.221967371,0,-0.2229903,-0.299154887,-0.299973752,-0.299434817,-0.300030003,-0.150421179,-0.146584579,-4.849731795,-7.916836225,9.0430657475,-12.2644665,2.7671827088,-3.449698151,12.576262305,-9.750975098,10.75511432,-0.219876869,-5.070174149,-8.138803596,9.0430657475,-12.4874568,2.4680278214,-3.749671904,12.276827488,-10.0510051,10.604693141 +050,2,4,29,069,Missouri,Dunklin County,31953,31959,31951,32018,31848,31738,31320,30868,30622,30147,29464,29173,28878,-8,67,-170,-110,-418,-452,-246,-475,-683,-291,-295,107,503,437,481,443,429,443,356,413,361,365,77,432,454,461,407,466,420,443,487,403,452,30,71,-17,20,36,-37,23,-87,-74,-42,-87,3,-7,-6,10,21,54,38,46,37,39,32,-39,4,-148,-140,-486,-470,-307,-437,-647,-289,-241,-36,-3,-154,-130,-465,-416,-269,-391,-610,-250,-209,-2,-1,1,0,11,1,0,3,1,1,1,672,672,672,670,671,667,662,671,668,671,660,645,15.726367459,13.684902765,15.129116472,14.05055663,13.796873995,14.408846967,11.716500189,13.856502994,12.313044665,12.575149438,13.506542231,14.217267404,14.50004718,12.908750674,14.986814176,13.660757847,14.579802202,16.339266243,13.745587257,15.572513824,2.2198252278,-0.532364638,0.629069292,1.1418059564,-1.189940181,0.7480891202,-2.863302013,-2.482763248,-1.432542593,-2.997364386,-0.218856008,-0.187893402,0.314534646,0.6660534746,1.7366694539,1.235973329,1.5139297997,1.2413816242,1.3302181217,1.1024788548,0.1250605762,-4.634703911,-4.403485044,-15.41438041,-15.11545636,-9.985363474,-14.3823331,-21.707403,-9.857257363,-8.303043875,-0.093795432,-4.822597313,-4.088950398,-14.74832694,-13.3787869,-8.749390145,-12.8684033,-20.46602137,-8.527039241,-7.20056502 +050,2,4,29,071,Missouri,Franklin County,101492,101464,101424,101618,101331,101717,101923,102265,102758,103340,103716,103860,104469,-40,194,-287,386,206,342,493,582,376,144,609,295,1252,1265,1268,1213,1228,1282,1210,1222,1202,1180,267,1008,930,936,976,982,1063,1006,1020,1132,1173,28,244,335,332,237,246,219,204,202,70,7,3,11,5,6,9,30,12,28,18,20,18,-64,-59,-630,61,-19,80,269,357,159,53,581,-61,-48,-625,67,-10,110,281,385,177,73,599,-7,-2,3,-13,-21,-14,-7,-7,-3,1,3,857,857,857,857,857,857,857,857,858,858,858,858,12.332423833,12.466186086,12.489657618,11.913180122,12.028130938,12.505913971,11.741986822,11.803570049,11.581300343,11.328235627,9.928980211,9.1648640792,9.2194948978,9.5855431153,9.6185867926,10.369568292,9.7623460684,9.8524070783,10.906848576,11.26103423,2.4034436225,3.301322007,3.2701627201,2.3276370065,2.4095441456,2.1363456783,1.9796407534,1.9511629704,0.6744517671,0.0672013978,0.1083519666,0.0492734628,0.0590993263,0.0883912787,0.293846847,0.1170600372,0.2717153975,0.1738660073,0.1927005049,0.1728035943,-0.581160548,-6.208456312,0.6008431504,-0.186603811,0.7835915921,2.6240958332,3.4643713185,1.5358163975,0.5106563379,5.5777160165,-0.472808581,-6.159182849,0.6599424767,-0.098212532,1.0774384391,2.7411558703,3.736086716,1.7096824048,0.7033568428,5.7505196108 +050,2,4,29,073,Missouri,Gasconade County,15222,15210,15207,15075,14914,14816,14814,14753,14751,14695,14680,14671,14566,-3,-132,-161,-98,-2,-61,-2,-56,-15,-9,-105,38,177,130,160,163,152,154,156,156,158,151,52,203,218,212,181,216,181,221,211,206,227,-14,-26,-88,-52,-18,-64,-27,-65,-55,-48,-76,0,4,1,1,2,2,0,-1,-1,-1,0,13,-110,-75,-43,18,3,26,11,41,41,-29,13,-106,-74,-42,20,5,26,10,40,40,-29,-2,0,1,-4,-4,-2,-1,-1,0,-1,0,250,250,250,250,250,250,250,250,250,250,250,250,11.690112938,8.6698456101,10.763538513,11.00236247,10.281733013,10.439262473,10.595666644,10.621276596,10.766243058,10.329377159,13.407304669,14.538664177,14.26168853,12.217347283,14.610883756,12.269522777,15.010527746,14.365957447,14.037000443,15.528268974,-1.717191731,-5.868818567,-3.498150017,-1.214984813,-4.329150742,-1.830260304,-4.414861102,-3.744680851,-3.270757385,-5.198891815,0.2641833432,0.0666911201,0.0672721157,0.1349983125,0.1352859607,0,-0.06792094,-0.068085106,-0.068140779,0,-7.265041939,-5.001834006,-2.892700975,1.2149848127,0.202928941,1.762472885,0.7471303403,2.7914893617,2.7937719328,-1.983787666,-7.000858596,-4.935142886,-2.82542886,1.3499831252,0.3382149017,1.762472885,0.6792094003,2.7234042553,2.725631154,-1.983787666 +050,2,4,29,075,Missouri,Gentry County,6738,6740,6749,6821,6767,6733,6753,6650,6623,6630,6579,6564,6484,9,72,-54,-34,20,-103,-27,7,-51,-15,-80,27,84,88,94,84,106,103,87,81,91,86,10,88,86,104,80,83,97,95,100,78,93,17,-4,2,-10,4,23,6,-8,-19,13,-7,1,3,2,3,2,0,1,1,1,1,0,-7,71,-58,-26,15,-127,-34,14,-32,-27,-73,-6,74,-56,-23,17,-127,-33,15,-31,-26,-73,-2,2,0,-1,-1,1,0,0,-1,-2,0,177,177,177,177,177,177,177,177,177,177,177,177,12.380250553,12.95260524,13.925925926,12.457363191,15.817354324,15.520229036,13.129102845,12.264365206,13.847675569,13.182096873,12.969786293,12.658227848,15.407407407,11.86415542,12.385286876,14.616138025,14.336376669,15.141191612,11.869436202,14.255058246,-0.589535741,0.2943773918,-1.481481481,0.593207771,3.4320674476,0.9040910118,-1.207273825,-2.876826406,1.978239367,-1.072961373,0.4421518055,0.2943773918,0.4444444444,0.2966038855,0,0.1506818353,0.1509092281,0.1514119161,0.152172259,0,10.464259396,-8.536944363,-3.851851852,2.2245291413,-18.95098112,-5.1231824,2.1127291934,-4.845181316,-4.108650993,-11.18945432,10.906411201,-8.242566971,-3.407407407,2.5211330268,-18.95098112,-4.972500565,2.2636384215,-4.6937694,-3.956478734,-11.18945432 +050,2,4,29,077,Missouri,Greene County,275174,275179,275320,277510,280550,283750,285427,287543,288114,289830,291430,293499,294997,141,2190,3040,3200,1677,2116,571,1716,1600,2069,1498,868,3568,3466,3633,3565,3601,3577,3500,3272,3381,3347,661,2543,2541,2632,2661,2751,2855,2983,2913,2980,3048,207,1025,925,1001,904,850,722,517,359,401,299,60,336,231,243,317,467,282,373,269,293,242,-88,833,1861,1933,499,816,-416,833,973,1365,946,-28,1169,2092,2176,816,1283,-134,1206,1242,1658,1188,-38,-4,23,23,-43,-17,-17,-7,-1,10,11,11242,11243,11241,11248,11254,11256,11259,11258,11269,11277,11279,11284,12.908127272,12.421603412,12.876129718,12.526858956,12.569593521,12.427539316,12.111900115,11.258300932,11.560377413,11.374758707,9.1999348805,9.106547683,9.3283714336,9.3503426878,9.6025969946,9.9191011314,10.322799441,10.023053367,10.189270835,10.358609064,3.7081923919,3.3150557288,3.5477582846,3.1765162682,2.9669965269,2.5084381845,1.7891006741,1.2352475656,1.3711065787,1.0161496425,1.2155635548,0.8278679712,0.8612440191,1.1138890011,1.6301027977,0.9797500942,1.290782498,0.925575474,1.0018309915,0.8224354966,3.0135846463,6.6695337419,6.8509657983,1.7534088693,2.8483166658,-1.445305104,2.8826322273,3.347899391,4.6672331172,3.214975123,4.2291482011,7.4974017131,7.7122098175,2.8672978704,4.4784194635,-0.465555009,4.1734147253,4.2734748649,5.6690641086,4.0374106196 +050,2,4,29,079,Missouri,Grundy County,10261,10260,10254,10254,10333,10346,10183,10033,10107,9990,9949,9780,9595,-6,0,79,13,-163,-150,74,-117,-41,-169,-185,42,120,140,157,175,153,139,150,162,130,129,57,121,118,130,147,153,145,126,117,120,129,-15,-1,22,27,28,0,-6,24,45,10,0,1,13,7,5,7,24,7,9,6,7,7,10,-12,52,-18,-201,-173,72,-149,-92,-185,-191,11,1,59,-13,-194,-149,79,-140,-86,-178,-184,-2,0,-2,-1,3,-1,1,-1,0,-1,-1,350,350,350,350,350,350,350,350,350,350,350,350,11.702750146,13.600816049,15.184486677,17.04905256,15.136525524,13.803376365,14.927601134,16.249561162,13.178569618,13.316129032,11.800273064,11.463544956,12.573141835,14.32120415,15.136525524,14.399205561,12.539184953,11.735794172,12.164833494,13.316129032,-0.097522918,2.1372710934,2.6113448426,2.7278484096,0,-0.595829196,2.3884161815,4.5137669893,1.0137361245,0,1.2677979325,0.6800408024,0.4835823783,0.6819621024,2.374356945,0.6951340616,0.8956560681,0.6018355986,0.7096152871,0.7225806452,-1.170275015,5.0517316753,-1.740896562,-19.58205465,-17.11515631,7.1499503476,-14.82808379,-9.228145845,-18.7541183,-19.71612903,0.0975229179,5.7317724778,-1.257314183,-18.90009255,-14.74079937,7.8450844091,-13.93242773,-8.626310246,-18.04450302,-18.99354839 +050,2,4,29,081,Missouri,Harrison County,8957,8961,8968,8887,8731,8717,8638,8631,8587,8519,8362,8346,8321,7,-81,-156,-14,-79,-7,-44,-68,-157,-16,-25,28,103,113,113,117,115,106,101,90,96,90,13,95,128,120,125,115,121,119,127,89,121,15,8,-15,-7,-8,0,-15,-18,-37,7,-31,0,1,1,-2,-1,-1,-1,-1,-1,-1,0,-7,-90,-143,-5,-70,-4,-28,-49,-119,-20,5,-7,-89,-142,-7,-71,-5,-29,-50,-120,-21,5,-1,0,1,0,0,-2,0,0,0,-2,1,145,145,145,145,145,145,145,145,145,145,145,145,11.537384486,12.82778976,12.952773957,13.483146067,13.318663501,12.312696016,11.808722086,10.662875422,11.491501077,10.799784004,10.641276953,14.530593711,13.755158184,14.405070585,13.318663501,14.05505866,13.913246814,15.046501984,10.653579124,14.519709606,0.8961075329,-1.702803951,-0.802384227,-0.921924517,0,-1.742362644,-2.104524728,-4.383626562,0.8379219536,-3.719925601,0.1120134416,0.1135202634,-0.229252636,-0.115240565,-0.115814465,-0.11615751,-0.11691804,-0.118476394,-0.119703136,0,-10.08120975,-16.23339766,-0.573131591,-8.066839528,-0.463257861,-3.252410268,-5.728983982,-14.09869084,-2.394062724,0.5999880002,-9.969196304,-16.1198774,-0.802384227,-8.182080092,-0.579072326,-3.368567778,-5.845902023,-14.21716723,-2.513765861,0.5999880002 +050,2,4,29,083,Missouri,Henry County,22272,22291,22265,22254,22228,22118,22050,21728,21634,21704,21885,21971,22076,-26,-11,-26,-110,-68,-322,-94,70,181,86,105,64,278,261,264,263,244,258,233,258,271,275,96,318,313,325,287,327,307,301,297,290,321,-32,-40,-52,-61,-24,-83,-49,-68,-39,-19,-46,1,2,0,-2,-4,-4,-2,-2,-3,-3,-2,6,28,31,-43,-33,-237,-42,140,222,108,155,7,30,31,-45,-37,-241,-44,138,219,105,153,-1,-1,-5,-4,-7,2,-1,0,1,0,-2,233,233,233,233,233,233,233,233,233,233,233,233,12.489049619,11.735083854,11.906372615,11.909074443,11.147151537,11.899820119,10.752688172,11.837848999,12.358628238,12.486661975,14.286035176,14.073108224,14.657466288,12.995834088,14.939010462,14.159863475,13.890811759,13.627291289,13.225100328,14.575339978,-1.796985557,-2.338024369,-2.751093672,-1.086759645,-3.791858925,-2.260043356,-3.138123587,-1.78944229,-0.86647209,-2.088678003,0.0898492778,0,-0.090199793,-0.181126607,-0.182740189,-0.092246668,-0.092297753,-0.137649407,-0.136811383,-0.090812087,1.2578898897,1.3938222202,-1.93929554,-1.494294512,-10.82735621,-1.937180019,6.4608426785,10.186056115,4.9252097775,7.0379367494,1.3477391675,1.3938222202,-2.029495332,-1.675421119,-11.0100964,-2.029426687,6.3685449259,10.048406708,4.7883983947,6.9471246623 +050,2,4,29,085,Missouri,Hickory County,9627,9629,9646,9614,9444,9349,9292,9269,9367,9396,9416,9496,9586,17,-32,-170,-95,-57,-23,98,29,20,80,90,21,82,78,63,64,75,80,74,81,70,82,29,152,158,136,137,156,161,150,163,129,155,-8,-70,-80,-73,-73,-81,-81,-76,-82,-59,-73,0,0,1,0,0,1,-1,-1,-1,-1,-1,25,39,-89,-21,15,57,179,105,104,139,165,25,39,-88,-21,15,58,178,104,103,138,164,0,-1,-2,-1,1,0,1,1,-1,1,-1,75,75,75,75,75,75,75,75,75,75,75,75,8.5150571132,8.1855388813,6.7046240622,6.8665844107,8.0814611282,8.5855333763,7.887864414,8.6115245588,7.4027072758,8.5944869511,15.784008307,16.580963375,14.473474166,14.698782254,16.809439147,17.27838592,15.988914353,17.329364236,13.64213198,16.245676554,-7.268951194,-8.395424494,-7.768850104,-7.832197843,-8.727978018,-8.692852543,-8.101049939,-8.717839677,-6.239424704,-7.651189603,0,0.1049428062,0,0,0.107752815,-0.107319167,-0.106592762,-0.106315118,-0.105752961,-0.104810816,4.0498442368,-9.339909749,-2.234874687,1.6093557213,6.1419104574,19.210130929,11.192240047,11.056772273,14.699661591,17.293784719,4.0498442368,-9.234966943,-2.234874687,1.6093557213,6.2496632725,19.102811762,11.085647285,10.950457155,14.593908629,17.188973902 +050,2,4,29,087,Missouri,Holt County,4912,4912,4915,4838,4679,4589,4529,4483,4464,4406,4382,4387,4232,3,-77,-159,-90,-60,-46,-19,-58,-24,5,-155,15,62,41,55,52,45,58,38,40,52,47,8,69,55,80,66,65,73,37,67,44,69,7,-7,-14,-25,-14,-20,-15,1,-27,8,-22,0,0,0,0,0,0,0,0,0,0,0,-3,-70,-149,-67,-45,-26,-3,-59,5,-4,-133,-3,-70,-149,-67,-45,-26,-3,-59,5,-4,-133,-1,0,4,2,-1,0,-1,0,-2,1,0,101,101,101,101,101,101,101,101,101,101,101,101,12.714036707,8.6161605548,11.868795857,11.40601009,9.9866844208,12.965239745,8.5682074408,9.1033227128,11.859961227,10.906137603,14.149492464,11.558264159,17.263703064,14.47685896,14.42521083,16.31831899,8.3427282976,15.248065544,10.035351808,16.011138183,-1.435455757,-2.942103604,-5.394907208,-3.07084887,-4.438526409,-3.353079244,0.2254791432,-6.144742831,1.8246094195,-5.10500058,0,0,0,0,0,0,0,0,0,0,-14.35455757,-31.31238836,-14.45835132,-9.870585655,-5.770084332,-0.670615849,-13.30326945,1.1379153391,-0.91230471,-30.86204896,-14.35455757,-31.31238836,-14.45835132,-9.870585655,-5.770084332,-0.670615849,-13.30326945,1.1379153391,-0.91230471,-30.86204896 +050,2,4,29,089,Missouri,Howard County,10144,10142,10141,10219,10198,10240,10131,10136,10033,10067,10027,9982,10001,-1,78,-21,42,-109,5,-103,34,-40,-45,19,41,119,123,101,130,118,121,110,119,108,106,17,125,82,95,105,106,106,115,125,82,90,24,-6,41,6,25,12,15,-5,-6,26,16,4,18,7,2,3,3,1,2,2,2,1,-31,67,-70,36,-139,-10,-119,36,-37,-73,3,-27,85,-63,38,-136,-7,-118,38,-35,-71,4,2,-1,1,-2,2,0,0,1,1,0,-1,714,714,714,714,714,714,716,717,717,718,719,720,11.689587426,12.048782877,9.8835502495,12.763241863,11.64454532,11.998611731,10.945273632,11.844331641,10.795142186,10.609017665,12.278978389,8.032521918,9.2964086506,10.308772274,10.46035427,10.511180525,11.44278607,12.441524833,8.1963116598,9.007656508,-0.589390963,4.016260959,0.587141599,2.4544695891,1.1841910495,1.4874312063,-0.497512438,-0.597193192,2.5988305263,1.601361157,1.768172888,0.6857030906,0.1957138663,0.2945363507,0.2960477624,0.0991620804,0.1990049751,0.1990643973,0.1999100405,0.1000850723,6.5815324165,-6.857030906,3.5228495939,-13.64685092,-0.986825875,-11.80028757,3.5820895522,-3.682691351,-7.296716478,0.3002552169,8.3497053045,-6.171327815,3.7185634602,-13.35231456,-0.690778112,-11.70112549,3.7810945274,-3.483626953,-7.096806437,0.4003402892 +050,2,4,29,091,Missouri,Howell County,40400,40378,40544,40578,40533,40234,40122,40071,40131,40069,40103,40084,40262,166,34,-45,-299,-112,-51,60,-62,34,-19,178,123,560,507,483,549,481,496,510,535,487,485,87,494,467,523,518,550,480,529,508,530,555,36,66,40,-40,31,-69,16,-19,27,-43,-70,7,15,11,11,13,20,7,4,2,3,4,117,-43,-90,-269,-150,5,41,-45,7,21,245,124,-28,-79,-258,-137,25,48,-41,9,24,249,6,-4,-6,-1,-6,-7,-4,-2,-2,0,-1,608,608,608,608,608,608,608,608,608,608,607,608,13.806365721,12.501386988,11.960330333,13.664194335,11.996059506,12.368768859,12.718204489,13.346305443,12.146607305,12.072785204,12.179186904,11.515084267,12.95083388,12.892627806,13.71690796,11.969776315,13.19201995,12.67275358,13.219100353,13.815249048,1.6271788171,0.986302721,-0.990503547,0.7715665289,-1.720848453,0.3989925438,-0.473815461,0.6735518635,-1.072493048,-1.742463844,0.3698133675,0.2712332483,0.2723884755,0.3235601573,0.4987966531,0.1745592379,0.0997506234,0.0498927306,0.0748250963,0.0995693625,-1.060131654,-2.219181122,-6.661136355,-3.73338643,0.1246991633,1.0224183936,-1.122194514,0.1746245572,0.5237756744,6.0986234536,-0.690318286,-1.947947874,-6.38874788,-3.409826273,0.6234958163,1.1969776315,-1.02244389,0.2245172878,0.5986007707,6.1981928161 +050,2,4,29,093,Missouri,Iron County,10630,10615,10591,10618,10544,10459,10359,10200,10127,10178,10193,10152,10098,-24,27,-74,-85,-100,-159,-73,51,15,-41,-54,31,101,120,107,91,98,113,95,106,106,104,18,133,142,116,152,167,152,164,154,141,174,13,-32,-22,-9,-61,-69,-39,-69,-48,-35,-70,1,9,5,3,0,4,0,2,1,2,1,-40,50,-58,-79,-39,-94,-33,119,63,-8,15,-39,59,-53,-76,-39,-90,-33,121,64,-6,16,2,0,1,0,0,0,-1,-1,-1,0,0,276,276,276,276,276,276,276,276,276,276,276,276,9.5242585695,11.341083073,10.189020616,8.7424344317,9.5335376234,11.11821715,9.3573011574,10.406951058,10.420250676,10.271604938,12.541845443,13.420281637,11.046041042,14.602747622,16.245926358,14.955477936,16.153656735,15.119532669,13.860899484,17.185185185,-3.017586873,-2.079198563,-0.857020426,-5.860313191,-6.712388735,-3.837260786,-6.796355577,-4.712581611,-3.440648808,-6.913580247,0.8486963082,0.4725451281,0.2856734752,0,0.3891239846,0,0.1969958138,0.0981787836,0.1966085033,0.0987654321,4.7149794898,-5.481523485,-7.522734847,-3.746757614,-9.144413639,-3.246912973,11.721250923,6.1852633646,-0.786434013,1.4814814815,5.563675798,-5.008978357,-7.237061372,-3.746757614,-8.755289654,-3.246912973,11.918246737,6.2834421482,-0.58982551,1.5802469136 +050,2,4,29,095,Missouri,Jackson County,674158,674164,674854,675644,677570,680063,683334,687182,692812,698768,701809,704350,705925,690,790,1926,2493,3271,3848,5630,5956,3041,2541,1575,2442,9581,9674,9473,9658,9401,9315,9348,9316,8930,8913,1445,6117,6038,6146,6090,6219,6219,6407,6414,6455,7121,997,3464,3636,3327,3568,3182,3096,2941,2902,2475,1792,185,1007,707,586,614,1087,626,1165,844,914,729,-420,-3677,-2304,-1311,-762,-332,1920,1853,-683,-858,-979,-235,-2670,-1597,-725,-148,755,2546,3018,161,56,-250,-72,-4,-113,-109,-149,-89,-12,-3,-22,10,33,11219,11219,11218,11219,11242,11312,10997,11127,11064,11062,11001,10935,14.188839969,14.297812467,13.955170506,14.167553545,13.718920465,13.500058696,13.435088173,13.303088656,12.701266358,12.640087926,9.0588805019,8.9239395986,9.0539932368,8.933568139,9.0754139317,9.0130826656,9.2082381178,9.1590822925,9.1810385597,10.098739608,5.1299594668,5.3738728686,4.9011772696,5.2339854056,4.6435065333,4.4869760303,4.2268500553,4.1440063631,3.5202277979,2.5413483186,1.4913017272,1.0449197244,0.8632671716,0.9006914347,1.5862638597,0.9072503214,1.6743557683,1.2052175639,1.2999952352,1.0338409176,-5.44539866,-3.405226372,-1.931302495,-1.11779621,-0.484489054,2.782620794,2.6631598615,-0.975312318,-1.220345637,-1.388381699,-3.954096933,-2.360306648,-1.068035323,-0.217104776,1.101774806,3.6898711154,4.3375156297,0.2299052462,0.0796495987,-0.354540781 +050,2,4,29,097,Missouri,Jasper County,117404,117395,117662,115313,115813,116814,117801,118623,119304,120113,120349,121228,121648,267,-2349,500,1001,987,822,681,809,236,879,420,415,1754,1686,1745,1726,1615,1687,1606,1610,1556,1548,299,1219,1083,1181,1149,1154,1154,1214,1297,1234,1290,116,535,603,564,577,461,533,392,313,322,258,25,186,128,101,107,151,95,141,107,116,85,130,-3090,-204,343,325,222,59,283,-180,438,68,155,-2904,-76,444,432,373,154,424,-73,554,153,-4,20,-27,-7,-22,-12,-6,-7,-4,3,9,2478,2478,2478,2478,2478,2479,2483,2483,2485,2487,2488,2488,15.057409593,14.589444718,15.002557743,14.713466743,13.661895577,14.180820168,13.415922846,13.390889205,12.882021053,12.747245508,10.464642129,9.371511643,10.153593521,9.7947701554,9.7621222888,9.700454341,10.141301578,10.787567266,10.216204357,10.62270459,4.5927674643,5.2179330755,4.8489642217,4.918696588,3.8997732887,4.4803658265,3.2746212675,2.6033219386,2.6658166961,2.124540918,1.5967378474,1.1076209513,0.8683428837,0.9121326428,1.277366088,0.7985642655,1.1778612212,0.8899535062,0.9603563253,0.6999456513,-26.52645134,-1.765270891,2.9489268228,2.7704963451,1.8779819308,0.4959504386,2.3640760681,-1.497118048,3.6261730214,0.559956521,-24.92971349,-0.65764994,3.8172697064,3.6826289879,3.1553480188,1.2945147041,3.5419372893,-0.607164542,4.5865293468,1.2599021723 +050,2,4,29,099,Missouri,Jefferson County,218733,218722,219130,219605,219885,220923,222066,223185,223439,223843,224656,225402,226543,408,475,280,1038,1143,1119,254,404,813,746,1141,713,2728,2599,2720,2611,2523,2601,2605,2600,2469,2496,403,1885,1778,1915,1848,1970,2023,2144,2156,2133,2347,310,843,821,805,763,553,578,461,444,336,149,21,103,52,49,61,97,42,79,55,64,47,100,-468,-577,225,369,496,-360,-125,322,340,937,121,-365,-525,274,430,593,-318,-46,377,404,984,-23,-3,-16,-41,-50,-27,-6,-11,-8,6,8,1983,1983,1983,1983,1983,1983,1984,1983,1984,1984,1983,1984,12.435752789,11.827345332,12.340973848,11.788103091,11.332933559,11.647381242,11.648132498,11.59422875,10.971919175,11.045591831,8.5928863665,8.0911966143,8.6885900437,8.3433222947,8.8489413836,9.0590742996,9.5867931193,9.6142912247,9.4787782908,10.386219562,3.8428664228,3.7361487178,3.6523838043,3.4447807959,2.4839921752,2.5883069428,2.0613393787,1.9799375249,1.4931408841,0.6593722687,0.4695317219,0.2366379212,0.2223190142,0.2754018723,0.4357092966,0.1880776671,0.3532447092,0.2452625312,0.2844077874,0.2079899103,-2.13340627,-2.62577078,1.0208526161,1.6659555881,2.2279568154,-1.61209429,-0.558931502,1.4359006375,1.5109163708,4.1465222538,-1.663874548,-2.389132859,1.2431716303,1.9413574603,2.6636661119,-1.424016622,-0.205686793,1.6811631687,1.7953241582,4.3545121641 +050,2,4,29,101,Missouri,Johnson County,52595,52565,52689,53417,54335,54331,54221,53717,53722,53893,53718,54187,54219,124,728,918,-4,-110,-504,5,171,-175,469,32,189,718,731,687,771,721,702,699,729,678,691,66,419,371,378,390,441,443,424,396,401,426,123,299,360,309,381,280,259,275,333,277,265,50,72,278,145,142,224,106,41,-19,39,32,-44,354,276,-459,-638,-1019,-361,-141,-491,150,-267,6,426,554,-314,-496,-795,-255,-100,-510,189,-235,-5,3,4,1,5,11,1,-4,2,3,2,3671,3668,3775,3851,3832,3840,3849,3854,3789,3726,3750,3734,13.533636175,13.56819363,12.644249351,14.205173557,13.359521207,13.067880379,12.990754077,13.548800773,12.566609518,12.748371861,7.8977626147,6.8861830871,6.9570978963,7.185496352,8.1713576312,8.2465398971,7.8799423872,7.3598423953,7.4324637413,7.8593435788,5.6358735604,6.6820105427,5.6871514549,7.0196772054,5.1881635754,4.8213404816,5.1108116898,6.1889583779,5.1341457764,4.8890282826,1.3571334326,5.1599970302,2.668728029,2.6162576461,4.1505308603,1.9732127067,0.761975561,-0.353123751,0.7228580696,0.5903732266,6.6725727103,5.1228747494,-8.447904588,-11.75473506,-18.88120958,-6.720092331,-2.620452539,-9.125461152,2.7802233446,-4.925926609,8.0297061429,10.28287178,-5.779176559,-9.138477412,-14.73067872,-4.746879625,-1.858476978,-9.478584903,3.5030814142,-4.335553383 +050,2,4,29,103,Missouri,Knox County,4131,4131,4125,4126,4091,4060,3994,3907,3929,3971,3943,3957,3940,-6,1,-35,-31,-66,-87,22,42,-28,14,-17,10,43,50,58,58,50,41,53,49,66,62,18,55,52,53,58,48,47,44,38,43,43,-8,-12,-2,5,0,2,-6,9,11,23,19,0,0,0,0,0,0,0,0,0,0,0,3,13,-34,-35,-70,-89,27,34,-39,-8,-35,3,13,-34,-35,-70,-89,27,34,-39,-8,-35,-1,0,1,-1,4,0,1,-1,0,-1,-1,87,87,87,87,87,87,87,87,87,87,87,87,10.422979033,12.169891688,14.231382652,14.402781227,12.656625744,10.464522716,13.417721519,12.383118524,16.708860759,15.702165379,13.331717368,12.656687355,13.00453932,14.402781227,12.150360714,11.995916284,11.139240506,9.6032347738,10.886075949,10.890211473,-2.908738335,-0.486795668,1.2268433321,0,0.5062650297,-1.531393568,2.2784810127,2.7798837503,5.8227848101,4.8119539065,0,0,0,0,0,0,0,0,0,0,3.151133196,-8.275526348,-8.587903325,-17.382667,-22.52879382,6.8912710567,8.6075949367,-9.855951478,-2.025316456,-8.864125617,3.151133196,-8.275526348,-8.587903325,-17.382667,-22.52879382,6.8912710567,8.6075949367,-9.855951478,-2.025316456,-8.864125617 +050,2,4,29,105,Missouri,Laclede County,35571,35594,35697,35668,35490,35672,35558,35506,35486,35467,35684,35869,35895,103,-29,-178,182,-114,-52,-20,-19,217,185,26,112,444,487,423,490,475,486,519,483,483,481,58,358,386,401,390,414,391,461,445,449,432,54,86,101,22,100,61,95,58,38,34,49,1,4,0,2,4,4,3,5,3,4,0,47,-118,-285,163,-218,-114,-118,-80,175,147,-24,48,-114,-285,165,-214,-110,-115,-75,178,151,-24,1,-1,6,-5,0,-3,0,-2,1,0,1,345,345,345,345,345,345,345,345,345,345,345,345,12.443074336,13.687849574,11.888367387,13.758247929,13.368231453,13.69168357,14.629402562,13.576759287,13.50048216,13.405049886,10.032929307,10.849096377,11.270059863,10.950442229,11.651469098,11.01532567,12.994517497,12.508608452,12.55013766,12.039462683,2.4101450291,2.8387531971,0.6183075237,2.8078056998,1.7167623551,2.6763578995,1.6348850648,1.0681508341,0.9503444999,1.3655872025,0.1120997688,0,0.0562097749,0.112312228,0.1125745807,0.0845165652,0.1409383677,0.0843276974,0.1118052353,0,-3.306943179,-8.01034318,4.5810966527,-6.121016426,-3.208375549,-3.324318233,-2.255013882,4.9191156835,4.1088423965,-0.668859038,-3.194843411,-8.01034318,4.6373064276,-6.008704198,-3.095800968,-3.239801668,-2.114075515,5.003443381,4.2206476318,-0.668859038 +050,2,4,29,107,Missouri,Lafayette County,33381,33369,33380,33213,33061,32828,32627,32633,32532,32604,32567,32774,33006,11,-167,-152,-233,-201,6,-101,72,-37,207,232,107,376,370,360,384,398,339,358,374,399,398,113,299,342,392,364,397,408,393,417,390,383,-6,77,28,-32,20,1,-69,-35,-43,9,15,1,2,-1,-1,-2,10,-1,6,1,3,1,18,-246,-181,-199,-223,-2,-29,105,6,195,217,19,-244,-182,-200,-225,8,-30,111,7,198,218,-2,0,2,-1,4,-3,-2,-4,-1,0,-1,724,724,724,724,724,724,724,724,724,724,724,724,11.292478188,11.165766364,10.927468925,11.733251852,12.197364389,10.404358168,10.992385163,11.47749766,12.212852573,12.100942536,8.9799228147,10.32078945,11.898799496,11.122144985,12.166717744,12.522059388,12.06705969,12.797103006,11.937374696,11.644876862,2.3125553737,0.844976914,-0.971330571,0.6111068673,0.0306466442,-2.11770122,-1.074674527,-1.319605346,0.2754778776,0.4560656735,0.0600663733,-0.030177747,-0.03035408,-0.061110687,0.3064664419,-0.030691322,0.1842299189,0.0306884964,0.0918259592,0.0304043782,-7.388163921,-5.462172194,-6.040461989,-6.813841571,-0.061293288,-0.890048339,3.2240235814,0.1841309785,5.9686873479,6.597750076,-7.328097548,-5.492349941,-6.070816069,-6.874952257,0.2451731535,-0.920739661,3.4082535004,0.2148194749,6.0605133071,6.6281544542 +050,2,4,29,109,Missouri,Lawrence County,38634,38647,38590,38502,38384,38109,37917,37999,38201,38271,38271,38288,38175,-57,-88,-118,-275,-192,82,202,70,0,17,-113,122,481,492,509,462,483,525,488,552,497,509,113,424,428,432,459,463,452,463,523,505,486,9,57,64,77,3,20,73,25,29,-8,23,1,2,-3,-10,-6,-6,-19,-14,-20,-16,-5,-68,-145,-176,-347,-189,74,150,62,-7,42,-132,-67,-143,-179,-357,-195,68,131,48,-27,26,-137,1,-2,-3,5,0,-6,-2,-3,-2,-1,1,559,560,559,559,559,559,559,559,559,559,557,534,12.478597001,12.798168717,13.308407305,12.153736879,12.724590337,13.779527559,12.762841301,14.42345379,12.983450672,13.313628814,10.999844342,11.133366283,11.29515119,12.07481651,12.197692186,11.86351706,12.109007218,13.665699877,13.192439818,12.712030655,1.4787526592,1.6648024348,2.0132561149,0.0789203693,0.5268981506,1.9160104987,0.6538340831,0.7577539129,-0.208989146,0.6015981586,0.0518860582,-0.078037614,-0.261461833,-0.157840739,-0.158069445,-0.498687664,-0.366147087,-0.522588905,-0.417978291,-0.130782208,-3.761739221,-4.578206696,-9.072725609,-4.971983269,1.9495231572,3.937007874,1.621508526,-0.182906117,1.0971930145,-3.452650301,-3.709853162,-4.65624431,-9.334187442,-5.129824008,1.791453712,3.43832021,1.2553614395,-0.705495022,0.6792147233,-3.58343251 +050,2,4,29,111,Missouri,Lewis County,10211,10205,10206,10217,10116,10110,10098,10141,10091,9957,9844,9787,9810,1,11,-101,-6,-12,43,-50,-134,-113,-57,23,28,111,112,113,114,107,131,119,127,115,116,15,101,119,104,96,133,117,129,132,102,104,13,10,-7,9,18,-26,14,-10,-5,13,12,0,3,3,1,3,-1,0,-2,-3,-2,1,-12,-2,-99,-16,-32,71,-65,-122,-104,-69,11,-12,1,-96,-15,-29,70,-65,-124,-107,-71,12,0,0,2,0,-1,-1,1,0,-1,1,-1,782,782,782,782,782,782,783,785,787,787,788,788,10.870097439,11.016574042,11.173736774,11.282660333,10.573644943,12.949782523,11.87150838,12.827634968,11.716163211,11.838546716,9.8908093816,11.70510992,10.283793138,9.5011876485,13.142941845,11.565836299,12.869114126,13.332659967,10.39172737,10.61386947,0.9792880576,-0.688535878,0.8899436369,1.7814726841,-2.569296902,1.3839462238,-0.997605746,-0.505024999,1.3244358413,1.2246772465,0.2937864173,0.2950868047,0.0988826263,0.296912114,-0.098819112,0,-0.199521149,-0.303014999,-0.20375936,0.1020564372,-0.195857612,-9.737864555,-1.582122021,-3.167062549,7.0161569247,-6.425464611,-12.1707901,-10.50451997,-7.029697927,1.1226208093,0.0979288058,-9.44277775,-1.483239395,-2.870150435,6.9173378131,-6.425464611,-12.37031125,-10.80753497,-7.233457287,1.2246772465 +050,2,4,29,113,Missouri,Lincoln County,52566,52536,52673,53051,53267,53784,54167,54569,55146,56040,57604,59040,60119,137,378,216,517,383,402,577,894,1564,1436,1079,176,740,701,699,733,746,747,732,772,827,823,80,419,411,429,435,452,502,519,495,490,525,96,321,290,270,298,294,245,213,277,337,298,2,14,11,14,5,8,1,2,2,0,3,41,45,-74,238,94,104,332,676,1280,1102,777,43,59,-63,252,99,112,333,678,1282,1102,780,-2,-2,-11,-5,-14,-4,-1,3,5,-3,1,632,632,632,632,632,632,632,632,631,631,631,632,13.998713632,13.186854531,13.059196084,13.580235477,13.721306651,13.617098847,13.167125358,13.586287002,14.179897809,13.813476112,7.9262986644,7.7315224139,8.0148714164,8.0592120499,8.3137139494,9.15098209,9.335707733,8.7114145929,8.4016323171,8.8117557213,6.0724149673,5.4553321169,5.0443246677,5.5210234273,5.4075927016,4.4661167571,3.8314176245,4.8748724086,5.7782654916,5.0017203904,0.2648405282,0.2069263906,0.2615575754,0.0926346213,0.1471453796,0.018229048,0.0359757523,0.0351976347,0,0.0503528898,0.8512731263,-1.392050264,4.4464787811,1.7415308798,1.9128899353,6.052043932,12.159804292,22.52648622,18.895099619,13.041398468,1.1161136544,-1.185123874,4.7080363565,1.834165501,2.0600353149,6.07027298,12.195780044,22.561683855,18.895099619,13.091751357 +050,2,4,29,115,Missouri,Linn County,12761,12773,12774,12602,12489,12330,12318,12290,12123,12159,12002,11906,11830,1,-172,-113,-159,-12,-28,-167,36,-157,-96,-76,28,130,138,126,165,156,121,143,137,133,135,19,168,179,164,192,180,181,182,183,150,158,9,-38,-41,-38,-27,-24,-60,-39,-46,-17,-23,-1,2,0,3,4,8,3,4,4,4,3,-7,-137,-71,-127,14,-11,-110,73,-114,-83,-55,-8,-135,-71,-124,18,-3,-107,77,-110,-79,-52,0,1,-1,3,-3,-1,0,-2,-1,0,-1,152,152,152,152,152,152,152,152,152,152,152,152,10.245901639,10.999960145,10.153511423,13.388510224,12.678803641,9.9127514029,11.778271971,11.340590207,11.125982935,11.37512639,13.240857503,14.268064246,13.215681534,15.579357352,14.629388817,14.828165322,14.990527963,15.14837962,12.548101054,13.313110886,-2.994955864,-3.268104101,-3.062170112,-2.190847128,-1.950585176,-4.915413919,-3.212255992,-3.807789413,-1.422118119,-1.937984496,0.157629256,0,0.241750272,0.3245699448,0.6501950585,0.2457706959,0.329462153,0.3311121228,0.3346160281,0.2527805865,-10.79760404,-5.659399785,-10.23409485,1.1359948069,-0.894018205,-9.011592184,6.0126842929,-9.436695501,-6.943282583,-4.634310752,-10.63997478,-5.659399785,-9.992344575,1.4605647517,-0.243823147,-8.765821489,6.3421464459,-9.105583378,-6.608666555,-4.381530165 +050,2,4,29,117,Missouri,Livingston County,15195,15196,15128,15121,14997,14878,15009,14943,15119,15161,15169,14982,14413,-68,-7,-124,-119,131,-66,176,42,8,-187,-569,49,155,164,174,152,171,147,158,151,170,152,63,187,198,172,192,206,216,181,161,178,193,-14,-32,-34,2,-40,-35,-69,-23,-10,-8,-41,0,7,6,5,5,7,4,7,4,4,4,-57,18,-98,-127,163,-38,240,59,15,-182,-530,-57,25,-92,-122,168,-31,244,66,19,-178,-526,3,0,2,1,3,0,1,-1,-1,-1,-2,1340,1287,1392,1430,1404,1614,1614,1864,1901,1994,1757,1257,10.24827267,10.890497377,11.648535565,10.171646535,11.418269231,9.7797884372,10.435931308,9.957138147,11.276574575,10.34189488,12.364045092,13.148283419,11.514644351,12.848395624,13.75534188,14.370301377,11.955085865,10.616551269,11.807236908,13.131484946,-2.115772422,-2.257786042,0.1338912134,-2.676749088,-2.33707265,-4.59051294,-1.519154557,-0.659413122,-0.530662333,-2.789590066,0.4628252174,0.3984328309,0.3347280335,0.334593636,0.4674145299,0.2661166922,0.4623513871,0.2637652489,0.2653311665,0.2721551284,1.1901219875,-6.507736237,-8.50209205,10.907752535,-2.537393162,15.96700153,3.8969616909,0.9891196835,-12.07256807,-36.06055452,1.6529472049,-6.109303407,-8.167364017,11.242346171,-2.069978632,16.233118222,4.3593130779,1.2528849324,-11.80723691,-35.78839939 +050,2,4,29,119,Missouri,McDonald County,23083,23083,23071,22897,22976,22651,22851,22721,22773,22796,23031,22912,22900,-12,-174,79,-325,200,-130,52,23,235,-119,-12,76,288,317,317,299,317,373,362,338,351,329,45,194,209,218,242,231,222,248,260,230,240,31,94,108,99,57,86,151,114,78,121,89,7,43,28,16,54,56,36,53,42,49,40,-53,-312,-53,-449,90,-274,-135,-143,116,-289,-140,-46,-269,-25,-433,144,-218,-99,-90,158,-240,-100,3,1,-4,9,-1,2,0,-1,-1,0,-1,157,157,157,157,157,157,157,157,157,157,157,157,12.530455969,13.820766028,13.895281303,13.14227946,13.91205126,16.397766738,15.887994031,14.751129247,15.279803234,14.363048983,8.4406543683,9.1121138796,9.5557455016,10.636895082,10.137803915,9.7595287291,10.884592596,11.347022498,10.012406678,10.477604121,4.0898016011,4.7086521483,4.3395358012,2.5053843787,3.7742473449,6.6382380094,5.0034014352,3.4041067493,5.2673965566,3.8854448616,1.8708666899,1.2207616681,0.7013391194,2.373522043,2.4576494339,1.5826262804,2.3261427725,1.8329805573,2.1330779444,1.7462673535,-13.57466063,-2.310727443,-19.68132904,3.9558700716,-12.02492759,-5.934848551,-6.276196537,5.0625177297,-12.58080665,-6.111935737,-11.70379394,-1.089965775,-18.97998992,6.3293921146,-9.567278153,-4.352222271,-3.950053765,6.895498287,-10.44772871,-4.365668384 +050,2,4,29,121,Missouri,Macon County,15566,15553,15580,15473,15550,15463,15436,15271,15145,15253,15167,15111,15095,27,-107,77,-87,-27,-165,-126,108,-86,-56,-16,37,188,166,168,185,189,165,181,180,171,171,24,208,199,205,194,187,201,198,205,202,196,13,-20,-33,-37,-9,2,-36,-17,-25,-31,-25,0,3,3,3,3,6,8,13,11,12,6,16,-89,109,-54,-19,-173,-98,111,-70,-37,2,16,-86,112,-51,-16,-167,-90,124,-59,-25,8,-2,-1,-2,1,-2,0,0,1,-2,0,1,286,286,286,286,286,286,286,286,286,286,286,286,12.108330918,10.701737421,10.834166317,11.974497557,12.309896766,10.849552867,11.908678203,11.834319527,11.295329943,11.322253857,13.396451229,12.829191245,13.220262471,12.557040681,12.179633308,13.216728038,13.02717284,13.477975016,13.343021336,12.977554128,-1.28812031,-2.127453825,-2.386096153,-0.582543124,0.1302634578,-2.367175171,-1.118494638,-1.64365549,-2.047691393,-1.655300271,0.1932180466,0.1934048931,0.1934672557,0.1941810415,0.3907903735,0.5260389269,0.8553194289,0.7232084155,0.7926547328,0.3972720652,-5.732135381,7.0270444509,-3.482410602,-1.229813263,-11.2677891,-6.443976854,7.3031120468,-4.602235371,-2.444018759,0.1324240217,-5.538917335,7.220449344,-3.288943346,-1.035632221,-10.87699873,-5.917937927,8.1584314758,-3.879026956,-1.651364027,0.5296960869 +050,2,4,29,123,Missouri,Madison County,12226,12217,12197,12257,12376,12272,12195,12182,12209,12236,12205,12118,12113,-20,60,119,-104,-77,-13,27,27,-31,-87,-5,28,143,148,133,136,140,137,151,159,122,127,23,143,183,163,172,176,169,161,190,143,174,5,0,-35,-30,-36,-36,-32,-10,-31,-21,-47,4,26,16,6,0,2,-2,-2,-3,-3,-3,-30,35,136,-81,-39,23,62,39,3,-63,44,-26,61,152,-75,-39,25,60,37,0,-66,41,1,-1,2,1,-2,-2,-1,0,0,0,1,168,168,168,167,167,167,167,167,167,167,166,165,11.695428151,12.016400763,10.791950665,11.117014755,11.486237027,11.233651757,12.354264676,13.010924267,10.031657279,10.48243985,11.695428151,14.85811716,13.226225252,14.059753954,14.439840834,13.857570415,13.172427899,15.54764535,11.758417958,14.361767983,0,-2.841716397,-2.434274586,-2.9427392,-2.953603807,-2.623918659,-0.818163224,-2.536721083,-1.726760679,-3.879328133,2.126441482,1.2990703528,0.4868549172,0,0.1640891004,-0.163994916,-0.163632645,-0.245489137,-0.246680097,-0.247616689,2.8625173796,11.042097999,-6.572541383,-3.187967466,1.8870246544,5.0838424009,3.1908365719,0.2454891371,-5.180282038,3.631711444,4.9889588615,12.341168351,-6.085686465,-3.187967466,2.0511137548,4.9198474847,3.0272039272,0,-5.426962135,3.3840947547 +050,2,4,29,125,Missouri,Maries County,9176,9150,9159,9170,9020,9031,8998,8934,8823,8791,8795,8751,8795,9,11,-150,11,-33,-64,-111,-32,4,-44,44,30,89,89,68,77,84,90,68,81,94,88,33,109,95,99,99,108,103,103,103,91,114,-3,-20,-6,-31,-22,-24,-13,-35,-22,3,-26,2,9,5,2,0,4,5,5,5,4,3,10,22,-151,40,-9,-44,-103,-2,21,-50,68,12,31,-146,42,-9,-40,-98,3,26,-46,71,0,0,2,0,-2,0,0,0,0,-1,-1,67,67,67,67,67,67,67,67,67,67,67,67,9.7113863277,9.7855964816,7.5342086311,8.5417937767,9.3687262994,10.13684744,7.7211309186,9.2118730809,10.714692807,10.030776245,11.893720334,10.445299615,10.968921389,10.982306284,12.045505242,11.601058737,11.695242421,11.7138633,10.372734526,12.994414681,-2.182334006,-0.659703134,-3.434712758,-2.440512508,-2.676778943,-1.464211297,-3.974111502,-2.501990219,0.3419582811,-2.963638436,0.9820503028,0.5497526113,0.2215943715,0,0.4461298238,0.5631581911,0.5677302146,0.5686341408,0.4559443748,0.3419582811,2.4005674068,-16.60252886,4.4318874301,-0.99839148,-4.907428062,-11.60105874,-0.227092086,2.3882633913,-5.699304685,7.7510543714,3.3826177096,-16.05277625,4.6534818016,-0.99839148,-4.461298238,-11.03790055,0.3406381288,2.9568975321,-5.24336031,8.0930126525 +050,2,4,29,127,Missouri,Marion County,28781,28778,28785,28786,28753,28781,28784,28719,28721,28607,28564,28543,28423,7,1,-33,28,3,-65,2,-114,-43,-21,-120,97,392,339,357,386,378,380,351,354,362,350,61,335,313,309,324,342,326,371,347,334,327,36,57,26,48,62,36,54,-20,7,28,23,3,16,9,16,17,18,13,17,14,16,12,-29,-70,-62,-31,-73,-115,-64,-109,-65,-65,-154,-26,-54,-53,-15,-56,-97,-51,-92,-51,-49,-142,-3,-2,-6,-5,-3,-4,-1,-2,1,0,-1,1368,1368,1368,1368,1367,1373,1369,1369,1372,1371,1373,1367,13.617967379,11.783312188,12.410053186,13.410926778,13.147140149,13.231197772,12.245325147,12.383900929,12.677955417,12.288031457,11.637803755,10.87957733,10.741474606,11.256840094,11.895031564,11.35097493,12.943064471,12.139021532,11.697340081,11.480532247,1.980163624,0.9037348581,1.6685785796,2.1540866846,1.2521085856,1.8802228412,-0.697739325,0.2448793969,0.9806153361,0.8074992101,0.5558354032,0.312831297,0.5561928599,0.5906366716,0.6260542928,0.4526462396,0.5930784259,0.4897587938,0.5603516206,0.4213039357,-2.431779889,-2.155060046,-1.077623666,-2.536263354,-3.999791315,-2.228412256,-3.802679319,-2.273880114,-2.276428459,-5.406733841,-1.875944486,-1.842228749,-0.521430806,-1.945626683,-3.373737022,-1.775766017,-3.209600893,-1.78412132,-1.716076838,-4.985429906 +050,2,4,29,129,Missouri,Mercer County,3785,3785,3770,3774,3708,3664,3682,3660,3654,3659,3625,3619,3558,-15,4,-66,-44,18,-22,-6,5,-34,-6,-61,10,42,39,40,41,51,40,52,55,43,43,17,49,48,45,36,52,35,60,38,36,34,-7,-7,-9,-5,5,-1,5,-8,17,7,9,0,3,0,1,1,1,3,4,2,3,2,-8,9,-57,-40,11,-20,-15,9,-53,-16,-71,-8,12,-57,-39,12,-19,-12,13,-51,-13,-69,0,-1,0,0,1,-2,1,0,0,0,-1,51,51,51,51,51,51,51,51,51,51,51,51,11.134676564,10.425020048,10.851871948,11.162537435,13.892672296,10.937927263,14.221249829,15.101592532,11.871893981,11.982722586,12.990455992,12.830793905,12.208355941,9.8012523822,14.165077636,9.5706863549,16.409134418,10.433827567,9.9392600773,9.474710882,-1.855779427,-2.405773857,-1.356483993,1.3612850531,-0.272405339,1.3672409078,-2.187884589,4.6677649643,1.9326339039,2.5080117041,0.7953340403,0,0.2712967987,0.2722570106,0.2724053391,0.8203445447,1.0939422945,0.5491488193,0.8282716731,0.5573359342,2.3860021209,-15.23656776,-10.85187195,2.9948271168,-5.448106783,-4.101722724,2.4613701627,-14.55244371,-4.417448923,-19.78542567,3.1813361612,-15.23656776,-10.58057515,3.2670841274,-5.175701444,-3.281378179,3.5553124573,-14.00329489,-3.58917725,-19.22808973 +050,2,4,29,131,Missouri,Miller County,24748,24733,24701,24705,24573,24805,24824,24865,24981,25199,25269,25607,25791,-32,4,-132,232,19,41,116,218,70,338,184,72,287,274,309,312,305,300,312,313,309,323,83,245,302,269,267,304,279,275,321,254,296,-11,42,-28,40,45,1,21,37,-8,55,27,4,0,-2,-3,-3,0,-1,-3,-3,-4,0,-24,-36,-98,196,-17,43,99,184,83,288,158,-20,-36,-100,193,-20,43,98,181,80,284,158,-1,-2,-4,-1,-6,-3,-3,0,-2,-1,-1,271,271,271,271,271,271,271,271,271,271,271,271,11.618022103,11.120581192,12.515695249,12.57329384,12.276358953,12.037074189,12.435233161,12.403899501,12.147181382,12.568582435,9.9178237461,12.256990949,10.895540524,10.759837998,12.236108595,11.194478995,10.960542049,12.720932076,9.9850617187,11.517957897,1.7001983565,-1.136409757,1.6201547248,1.8134558424,0.0402503572,0.8425951932,1.474691112,-0.317032575,2.1621196635,1.0506245379,0,-0.081172125,-0.121511604,-0.120897056,0,-0.040123581,-0.11956955,-0.118887216,-0.157245066,0,-1.457312877,-3.977434149,7.9387581514,-0.685083318,1.7307653605,3.9722344822,7.3335990434,3.2892129666,11.321644783,6.1480991478,-1.457312877,-4.058606275,7.817246547,-0.805980374,1.7307653605,3.9321109016,7.2140294938,3.170325751,11.164399717,6.1480991478 +050,2,4,29,133,Missouri,Mississippi County,14358,14377,14333,14241,14288,14189,14197,13984,13755,13615,13369,13208,12691,-44,-92,47,-99,8,-213,-229,-140,-246,-161,-517,44,171,198,169,152,137,145,159,145,162,150,74,202,186,197,153,139,170,185,192,159,198,-30,-31,12,-28,-1,-2,-25,-26,-47,3,-48,0,-5,-4,-3,-1,0,0,0,-1,0,0,-16,-55,40,-68,11,-212,-203,-114,-198,-163,-466,-16,-60,36,-71,10,-212,-203,-114,-199,-163,-466,2,-1,-1,0,-1,1,-1,0,0,-1,-3,1874,1837,1836,1851,1874,1906,1873,1874,1875,1845,1846,1427,11.968922797,13.88061271,11.869227798,10.709504685,9.7228629218,10.454594614,11.618560468,10.747109398,12.190992211,11.583458821,14.138727515,13.039363455,13.835727078,10.779961953,9.8648025265,12.257110927,13.518450859,14.230655203,11.965233096,15.290165643,-2.169804718,0.8412492551,-1.96649928,-0.070457268,-0.141939605,-1.802516313,-1.899890391,-3.483545805,0.225759115,-3.706706823,-0.349968503,-0.280416418,-0.210696351,-0.070457268,0,0,0,-0.074117996,0,0,-3.849653531,2.8041641838,-4.775783966,0.7750299443,-15.0455981,-14.63643246,-8.330288637,-14.67536318,-12.26624525,-35.9859454,-4.199622034,2.5237477654,-4.986480317,0.7045726767,-15.0455981,-14.63643246,-8.330288637,-14.74948117,-12.26624525,-35.9859454 +050,2,4,29,135,Missouri,Moniteau County,15607,15610,15630,15711,15674,15748,15815,15878,15990,16028,16118,15816,15585,20,81,-37,74,67,63,112,38,90,-302,-231,45,201,215,225,195,206,212,198,202,196,189,21,139,142,153,141,151,145,159,169,131,167,24,62,73,72,54,55,67,39,33,65,22,0,9,10,3,5,22,6,7,7,3,4,-3,11,-121,1,13,-14,41,-7,50,-371,-256,-3,20,-111,4,18,8,47,0,57,-368,-252,-1,-1,1,-2,-5,0,-2,-1,0,1,-1,1316,1321,1316,1271,1329,1372,1376,1373,1369,1377,1124,883,12.826648799,13.70081249,14.321176246,12.356239901,12.999716026,13.304882641,12.368042976,12.567660051,12.275317843,12.03783319,8.8701700648,9.0489087144,9.7383998472,8.9345119285,9.5289180576,9.1000376553,9.9319132988,10.514527468,8.2044216196,10.63660393,3.9564787339,4.6519037757,4.5827763987,3.4217279726,3.470797968,4.2048449856,2.4361296771,2.0531325826,4.0708962235,1.4012292602,0.5743275582,0.6372470926,0.1909490166,0.3168266641,1.3883191872,0.3765532823,0.4372540446,0.4355129721,0.187887518,0.2547689564,0.7019559044,-7.71068982,0.0636496722,0.8237493267,-0.883475846,2.5731140956,-0.437254045,3.1108069433,-23.23542306,-16.30521321,1.2762834626,-7.073442727,0.2545986888,1.1405759909,0.5048433408,2.9496673779,0,3.5463199154,-23.04753554,-16.05044425 +050,2,4,29,137,Missouri,Monroe County,8840,8844,8787,8685,8691,8768,8735,8635,8629,8594,8630,8627,8672,-57,-102,6,77,-33,-100,-6,-35,36,-3,45,23,100,83,81,98,94,105,102,89,89,88,34,83,94,79,94,98,106,102,110,89,113,-11,17,-11,2,4,-4,-1,0,-21,0,-25,0,0,0,0,0,0,0,0,0,0,0,-49,-119,18,74,-36,-97,-5,-35,58,-1,70,-49,-119,18,74,-36,-97,-5,-35,58,-1,70,3,0,-1,1,-1,1,0,0,-1,-2,0,128,128,128,128,128,128,128,128,128,128,128,128,11.446886447,9.5534069982,9.278881952,11.198080329,10.823258492,12.164040778,11.844626372,10.334417092,10.314654923,10.173998497,9.5009157509,10.819521179,9.0497737557,10.741015826,11.283822683,12.279888786,11.844626372,12.772875058,10.314654923,13.064338979,1.945970696,-1.26611418,0.2291081963,0.4570645032,-0.460564191,-0.115848007,0,-2.438457966,0,-2.890340482,0,0,0,0,0,0,0,0,0,0,-13.62179487,2.0718232044,8.4770032648,-4.113580529,-11.16868164,-0.579240037,-4.064332579,6.734788667,-0.115894999,8.0929533499,-13.62179487,2.0718232044,8.4770032648,-4.113580529,-11.16868164,-0.579240037,-4.064332579,6.734788667,-0.115894999,8.0929533499 +050,2,4,29,139,Missouri,Montgomery County,12236,12226,12209,12206,11971,11852,11725,11579,11459,11388,11458,11472,11294,-17,-3,-235,-119,-127,-146,-120,-71,70,14,-178,32,168,142,145,127,130,126,116,127,145,135,51,169,155,145,168,148,176,176,170,166,168,-19,-1,-13,0,-41,-18,-50,-60,-43,-21,-33,1,5,6,5,3,3,4,3,4,2,0,3,-8,-235,-124,-89,-131,-75,-13,109,33,-143,4,-3,-229,-119,-86,-128,-71,-10,113,35,-143,-2,1,7,0,0,0,1,-1,0,0,-2,394,394,394,394,394,394,394,394,394,394,394,394,13.762031538,11.74670141,12.17311002,10.77321118,11.156882939,10.938449518,10.154506062,11.117919986,12.647187091,11.859790916,13.843948392,12.822103652,12.17311002,14.251176995,12.701682115,15.279104089,15.406836784,14.882255099,14.47884867,14.758850918,-0.081916854,-1.075402242,0,-3.477965814,-1.544799176,-4.340654571,-5.252330722,-3.764335113,-1.831661579,-2.899060002,0.409584272,0.4963394962,0.4197624145,0.2544853035,0.2574665294,0.3472523657,0.2626165361,0.3501707082,0.1744439599,0,-0.655334835,-19.4399636,-10.41010788,-7.54973067,-11.24270512,-6.510981856,-1.13800499,9.542151799,2.878325338,-12.56259334,-0.245750563,-18.94362411,-9.990345464,-7.295245366,-10.98523859,-6.16372949,-0.875388454,9.8923225072,3.0527692979,-12.56259334 +050,2,4,29,141,Missouri,Morgan County,20565,20567,20542,20375,20079,20123,20081,20072,20106,20181,20466,20720,20716,-25,-167,-296,44,-42,-9,34,75,285,254,-4,61,232,269,243,247,263,277,280,265,255,254,85,302,303,294,283,281,308,294,301,294,303,-24,-70,-34,-51,-36,-18,-31,-14,-36,-39,-49,1,1,0,-1,-1,-2,0,-1,-1,-1,0,2,-96,-265,96,-4,13,65,89,323,294,46,3,-95,-265,95,-5,11,65,88,322,293,46,-4,-2,3,0,-1,-2,0,1,-1,0,-1,302,302,302,302,302,302,302,302,302,302,302,302,11.340029816,13.299055718,12.088950798,12.287334594,13.09989291,13.78864055,13.900265594,13.039092676,12.382848541,12.259870644,14.761590537,14.979977258,14.626138003,14.078201174,13.996463527,15.331773607,14.595278874,14.810441115,14.276695965,14.6249638,-3.42156072,-1.680921541,-2.537187205,-1.79086658,-0.896570617,-1.543133058,-0.69501328,-1.771348439,-1.893847424,-2.365093156,0.0488794389,0,-0.049748769,-0.049746294,-0.099618957,0,-0.049643806,-0.049204123,-0.04856019,0,-4.692426131,-13.10130024,4.7758817969,-0.198985176,0.6475232237,3.235601573,4.4182987068,15.892931828,14.276695965,2.2202915339,-4.643546692,-13.10130024,4.7261330282,-0.24873147,0.5479042662,3.235601573,4.3686549011,15.843727704,14.228135774,2.2202915339 +050,2,4,29,143,Missouri,New Madrid County,18956,18932,18928,18758,18468,18315,18230,18070,17851,17541,17234,17052,16693,-4,-170,-290,-153,-85,-160,-219,-310,-307,-182,-359,63,230,209,231,258,229,236,230,223,210,215,36,259,252,251,231,261,225,245,263,225,251,27,-29,-43,-20,27,-32,11,-15,-40,-15,-36,1,-5,1,1,3,3,1,0,0,0,0,-32,-135,-253,-138,-112,-132,-229,-296,-269,-167,-321,-31,-140,-252,-137,-109,-129,-228,-296,-269,-167,-321,0,-1,5,4,-3,1,-2,1,2,0,-2,332,332,332,332,332,332,332,332,332,332,332,332,12.20612429,11.228711116,12.560150069,14.119578602,12.61707989,13.139945993,12.997287523,12.825305536,12.249897918,12.742628538,13.745157353,13.538924408,13.64760895,12.641948283,14.380165289,12.527490883,13.844936709,15.125808771,13.124890626,14.876277967,-1.539033063,-2.310213292,-1.08745888,1.4776303188,-1.763085399,0.6124551098,-0.847649186,-2.300503235,-0.874992708,-2.13364943,-0.265350528,0.0537258905,0.054372944,0.1641811465,0.1652892562,0.0556777373,0,0,0,0,-7.164464257,-13.5926503,-7.503466275,-6.129429471,-7.272727273,-12.75020183,-16.72694394,-15.47088426,-9.741585487,-19.02504075,-7.429814785,-13.53892441,-7.449093331,-5.965248324,-7.107438017,-12.69452409,-16.72694394,-15.47088426,-9.741585487,-19.02504075 +050,2,4,29,145,Missouri,Newton County,58114,58114,58172,58564,58651,58396,58148,58165,58221,58206,58233,58329,58451,58,392,87,-255,-248,17,56,-15,27,96,122,182,743,793,686,717,728,708,680,712,731,723,117,574,589,659,634,648,628,664,666,672,652,65,169,204,27,83,80,80,16,46,59,71,12,32,20,31,30,17,4,7,-3,1,10,-14,194,-133,-311,-362,-73,-24,-36,-13,35,40,-2,226,-113,-280,-332,-56,-20,-29,-16,36,50,-5,-3,-4,-2,1,-7,-4,-2,-3,1,1,880,880,880,880,880,880,880,880,880,881,880,880,12.729577851,13.530691464,11.721786974,12.304365733,12.517947263,12.166411768,11.681139255,12.229579436,12.542681148,12.382257236,9.8341557018,10.049908288,11.260433843,10.880010983,11.142348663,10.791675975,11.406288919,11.439466158,11.530344366,11.166295599,2.8954221491,3.4807831762,0.4613531316,1.4243547501,1.3755986003,1.374735793,0.2748503354,0.7901132782,1.0123367821,1.2159616373,0.548245614,0.3412532526,0.5297017437,0.5148270181,0.2923147026,0.0687367896,0.1202470217,-0.051529127,0.0171582505,0.1712622024,3.3237390351,-2.26933413,-5.31410459,-6.212246019,-1.255233723,-0.412420738,-0.618413255,-0.223292883,0.6005387691,0.6850488097,3.8719846491,-1.928080877,-4.784402847,-5.697419001,-0.96291902,-0.343683948,-0.498166233,-0.27482201,0.6176970196,0.8563110122 +050,2,4,29,147,Missouri,Nodaway County,23370,23373,23402,23439,23336,23165,23002,22649,22486,22431,22244,22089,21743,29,37,-103,-171,-163,-353,-163,-55,-187,-155,-346,72,220,222,226,240,222,231,226,192,214,206,26,197,211,181,196,200,197,189,213,183,183,46,23,11,45,44,22,34,37,-21,31,23,4,34,24,20,9,21,10,13,7,8,7,-20,-22,-137,-240,-222,-400,-207,-106,-174,-195,-374,-16,12,-113,-220,-213,-379,-197,-93,-167,-187,-367,-1,2,-1,4,6,4,0,1,1,1,-2,3611,3611,3611,3612,3621,3622,3621,3625,3627,3647,3632,3444,9.3934800709,9.4922501336,9.7202210705,10.397036844,9.7259643819,10.23595879,10.063005098,8.5954113039,9.6542079264,9.3995254609,8.4114344271,9.0219134153,7.784778822,8.490913423,8.7621300738,8.7293674532,8.4155219627,9.5355344152,8.2557011707,8.3500638803,0.9820456438,0.4703367183,1.9354422486,1.9061234215,0.9638343081,1.5065913371,1.6474831356,-0.940123111,1.3985067557,1.0494615806,1.4517196473,1.0261892036,0.8601965549,0.3898888817,0.9200236578,0.4431150991,0.578845426,0.3133743705,0.3609049692,0.3194013506,-0.939348007,-5.857830037,-10.32235866,-9.617259081,-17.52426015,-9.172482552,-4.719816551,-7.789591494,-8.797058625,-17.06515788,0.5123716402,-4.831640834,-9.462162104,-9.227370199,-16.60423649,-8.729367453,-4.140971125,-7.476217124,-8.436153655,-16.74575652 +050,2,4,29,149,Missouri,Oregon County,10881,10881,10934,11049,10973,10937,10835,10864,10753,10568,10557,10517,10411,53,115,-76,-36,-102,29,-111,-185,-11,-40,-106,32,130,142,124,133,142,112,114,118,113,118,33,143,127,134,141,147,149,150,158,130,151,-1,-13,15,-10,-8,-5,-37,-36,-40,-17,-33,0,-2,-4,-1,-1,1,1,2,1,2,1,51,131,-89,-22,-95,36,-75,-150,28,-24,-74,51,129,-93,-23,-96,37,-74,-148,29,-22,-73,3,-1,2,-3,2,-3,0,-1,0,-1,0,121,121,121,121,121,121,121,121,121,121,121,121,11.827321112,12.896194714,11.319032405,12.217527099,13.088160745,10.362214923,10.693682285,11.171597633,10.724115023,11.27675841,13.010053223,11.533920625,12.231857599,12.952415947,13.549011475,13.785446639,14.070634586,14.958579882,12.33747746,14.430428135,-1.182732111,1.3622740895,-0.912825194,-0.734888848,-0.46085073,-3.423231716,-3.376952301,-3.786982249,-1.613362437,-3.153669725,-0.181958786,-0.363273091,-0.091282519,-0.091861106,0.0921701461,0.0925197761,0.1876084611,0.0946745562,0.1898073455,0.0955657492,11.918300505,-8.082826265,-2.008215427,-8.726805071,3.3181252592,-6.938983208,-14.07063459,2.650887574,-2.277688147,-7.071865443,11.736341719,-8.446099355,-2.099497946,-8.818666177,3.4102954053,-6.846463432,-13.88302612,2.7455621302,-2.087880801,-6.976299694 +050,2,4,29,151,Missouri,Osage County,13878,13911,13907,13909,13848,13679,13640,13540,13612,13659,13640,13621,13535,-4,2,-61,-169,-39,-100,72,47,-19,-19,-86,38,147,156,142,137,158,164,165,143,150,139,21,137,123,135,122,136,118,141,156,126,138,17,10,33,7,15,22,46,24,-13,24,1,1,2,2,2,1,0,0,0,0,0,0,-22,-10,-98,-180,-57,-120,27,24,-6,-42,-88,-21,-8,-96,-178,-56,-120,27,24,-6,-42,-88,0,0,2,2,2,-2,-1,-1,0,-1,1,405,405,405,405,405,405,405,405,405,405,405,405,10.569456428,11.240407825,10.317143169,10.029649694,11.626195732,12.080141426,12.100766382,10.476574233,11.004732035,10.237148328,9.8504457866,8.8626292467,9.8085516039,8.9315128665,10.007358352,8.6918090748,10.340654908,11.428990073,9.2439749092,10.163499779,0.7190106414,2.3777785784,0.5085915646,1.0981368278,1.6188373804,3.3883323512,1.7601114737,-0.952415839,1.7607571256,0.0736485491,0.1438021283,0.1441077926,0.1453118756,0.0732091219,0,0,0,0,0,0,-0.719010641,-7.061281839,-13.07806881,-4.172919946,-8.830022075,1.9888037714,1.7601114737,-0.439576541,-3.08132497,-6.481072323,-0.575208513,-6.917174046,-12.93275693,-4.099710824,-8.830022075,1.9888037714,1.7601114737,-0.439576541,-3.08132497,-6.481072323 +050,2,4,29,153,Missouri,Ozark County,9723,9728,9746,9649,9600,9512,9448,9373,9204,9236,9011,9155,9083,18,-97,-49,-88,-64,-75,-169,32,-225,144,-72,17,82,100,89,90,85,73,95,84,75,70,15,120,132,122,137,133,123,133,145,104,130,2,-38,-32,-33,-47,-48,-50,-38,-61,-29,-60,0,-3,-2,-3,-3,0,0,0,0,0,0,15,-55,-14,-50,-13,-26,-119,72,-163,174,-12,15,-58,-16,-53,-16,-26,-119,72,-163,174,-12,1,-1,-1,-2,-1,-1,0,-2,-1,-1,0,123,123,123,123,123,123,123,123,123,123,123,123,8.4557875741,10.390150138,9.3135203014,9.4936708861,9.0324637373,7.8591807073,10.303687636,9.2069929303,8.2571837499,7.6762802939,12.374323279,13.714998182,12.766848054,14.451476793,14.133149142,13.242181192,14.42516269,15.893023511,11.449961466,14.255949117,-3.918535705,-3.324848044,-3.453327752,-4.957805907,-5.100685405,-5.383000484,-4.121475054,-6.68603058,-3.192777717,-6.579668823,-0.309358082,-0.207803003,-0.313938887,-0.316455696,0,0,0,0,0,0,-5.671564836,-1.454621019,-5.232314776,-1.371308017,-2.762871261,-12.81154115,7.8091106291,-17.86595057,19.1566663,-1.315933765,-5.980922918,-1.662424022,-5.546253663,-1.687763713,-2.762871261,-12.81154115,7.8091106291,-17.86595057,19.1566663,-1.315933765 +050,2,4,29,155,Missouri,Pemiscot County,18296,18285,18260,18187,18081,17782,17574,17427,17092,16809,16281,15864,15600,-25,-73,-106,-299,-208,-147,-335,-283,-528,-417,-264,64,297,276,310,270,271,273,249,244,227,221,32,211,232,262,263,235,241,244,232,208,238,32,86,44,48,7,36,32,5,12,19,-17,1,1,-3,-2,-4,-2,-2,-3,-4,-3,-1,-59,-161,-145,-352,-213,-181,-367,-285,-538,-432,-245,-58,-160,-148,-354,-217,-183,-369,-288,-542,-435,-246,1,1,-2,7,2,0,2,0,2,-1,-1,202,202,202,202,202,202,202,202,202,202,202,202,16.297637666,15.220028675,17.288012715,15.273220953,15.485271849,15.817375938,14.689832158,14.747657903,14.123502878,14.047800661,11.578456389,12.793647292,14.611159133,14.877248558,13.428187766,13.963324546,14.394855609,14.022363252,12.941359465,15.128400712,4.7191812769,2.426381383,2.6768535817,0.3959723951,2.0570840833,1.854051392,0.2949765494,0.725294651,1.1821434127,-1.080600051,0.0548742009,-0.165435094,-0.111535566,-0.22626994,-0.114282449,-0.115878212,-0.17698593,-0.241764884,-0.186654223,-0.063564709,-8.834746344,-7.996029558,-19.6302596,-12.04887431,-10.34256164,-21.2636519,-16.81366331,-32.51737685,-26.87820812,-15.57335367,-8.779872143,-8.161464652,-19.74179516,-12.27514425,-10.45684409,-21.37953011,-16.99064924,-32.75914173,-27.06486234,-15.63691838 +050,2,4,29,157,Missouri,Perry County,18971,18964,18931,19000,18991,19047,19116,19066,19224,19267,19284,19164,19194,-33,69,-9,56,69,-50,158,43,17,-120,30,63,232,215,216,221,213,232,222,218,215,216,68,199,189,187,182,205,190,220,190,209,226,-5,33,26,29,39,8,42,2,28,6,-10,3,15,2,3,-2,-3,12,21,17,16,10,-31,22,-33,27,36,-53,106,21,-27,-142,29,-28,37,-31,30,34,-56,118,42,-10,-126,39,0,-1,-4,-3,-4,-2,-2,-1,-1,0,1,286,286,286,286,286,286,286,286,286,286,286,286,12.232738393,11.318470164,11.357063989,11.581898698,11.157089728,12.118046487,11.535164064,11.309693653,11.183936746,11.26231816,10.492736812,9.9497249349,9.8322729902,9.5380342216,10.738044105,9.9242622095,11.431243667,9.8570724495,10.871826883,11.783721779,1.7400015818,1.3687452291,1.5247909985,2.0438644761,0.4190456236,2.1937842779,0.103920397,1.4526212031,0.3121098627,-0.521403619,0.7909098099,0.1052880945,0.1577369998,-0.104813563,-0.157142109,0.626795508,1.0911641682,0.8819485876,0.8322929671,0.5214036185,1.1600010545,-1.73725356,1.4196329986,1.8866441318,-2.776177256,5.5366936537,1.0911641682,-1.400741874,-7.386600083,1.5120704938,1.9509108645,-1.631965466,1.5773699984,1.7818305689,-2.933319365,6.1634891617,2.1823283365,-0.518793287,-6.554307116,2.0334741123 +050,2,4,29,159,Missouri,Pettis County,42201,42201,42263,42147,42299,42197,42201,42303,42274,42477,42449,42417,42490,62,-116,152,-102,4,102,-29,203,-28,-32,73,167,598,579,574,558,597,574,579,556,631,587,117,458,395,432,406,405,434,489,487,449,438,50,140,184,142,152,192,140,90,69,182,149,9,45,29,45,41,52,36,51,38,41,37,6,-302,-51,-288,-184,-141,-202,65,-135,-255,-115,15,-257,-22,-243,-143,-89,-166,116,-97,-214,-78,-3,1,-10,-1,-5,-1,-3,-3,0,0,2,851,851,851,851,851,851,851,851,851,851,851,851,14.16893733,13.712905289,13.586441962,13.223062158,14.129508662,13.573430129,13.663555592,13.093752208,14.870501732,13.826892953,10.851794811,9.3550908273,10.225336111,9.6210810683,9.5853450724,10.262837414,11.539686847,11.468808139,10.581387128,10.317170551,3.3171425187,4.3578144613,3.3611058512,3.6019810896,4.5441635899,3.3105927143,2.1238687449,1.624944069,4.2891146042,3.5097224022,1.066224381,0.6868294531,1.0651391782,0.9715870044,1.2307109723,0.8512952694,1.2035256221,0.8948967336,0.9662291141,0.8715418046,-7.15555029,-1.207872487,-6.81689074,-4.360292898,-3.337120136,-4.776712345,1.5339052047,-3.179238396,-6.009473759,-2.708846149,-6.089325909,-0.521043033,-5.751751562,-3.388705894,-2.106409164,-3.925417076,2.7374308268,-2.284341662,-5.043244644,-1.837304345 +050,2,4,29,161,Missouri,Phelps County,45156,45125,45298,45260,45248,45030,44957,44801,44772,44606,44549,44593,44414,173,-38,-12,-218,-73,-156,-29,-166,-57,44,-179,144,548,559,521,516,510,526,480,480,447,440,74,441,401,436,432,478,469,521,425,449,484,70,107,158,85,84,32,57,-41,55,-2,-44,46,224,149,179,194,243,179,239,176,194,148,58,-371,-324,-489,-358,-434,-266,-365,-291,-148,-284,104,-147,-175,-310,-164,-191,-87,-126,-115,46,-136,-1,2,5,7,7,3,1,1,3,0,1,3001,2996,3006,3008,3008,3011,3011,3014,3018,3018,3017,3012,12.102740785,12.352499227,11.542125435,11.468323202,11.36388957,11.744610541,10.740898208,10.767764007,10.028942586,9.886862831,9.7396143908,8.8610951518,9.6590531469,9.601386867,10.650861205,10.471905597,11.65834993,9.5339577141,10.073814812,10.875549114,2.3631263941,3.4914040748,1.8830722878,1.8669363352,0.7130283652,1.2727049446,-0.917451722,1.2338062924,-0.044872226,-0.988686283,4.9471057223,3.2925266275,3.9655287002,4.3117339171,5.4145591479,3.9967400891,5.3480722325,3.9481801357,4.3526059545,3.3255811341,-8.193643853,-7.159588103,-10.8332041,-7.956704857,-9.670447202,-5.939289741,-8.167558012,-6.527956929,-3.320544749,-6.381520555,-3.24653813,-3.867061475,-6.867675403,-3.64497094,-4.255888055,-1.942549652,-2.819485779,-2.579776793,1.0320612057,-3.05593942 +050,2,4,29,163,Missouri,Pike County,18516,18511,18474,18665,18554,18607,18493,18404,18508,18556,18495,17678,17552,-37,191,-111,53,-114,-89,104,48,-61,-817,-126,48,223,230,199,232,215,227,220,212,211,199,62,171,184,199,211,215,203,200,237,180,197,-14,52,46,0,21,0,24,20,-25,31,2,0,-1,-1,-1,0,7,3,4,2,3,2,-23,139,-158,56,-135,-97,78,25,-38,-852,-129,-23,138,-159,55,-135,-90,81,29,-36,-849,-127,0,1,2,-2,0,1,-1,-1,0,1,-1,2162,2162,2303,2295,2292,2301,2192,2297,2278,2372,1714,1522,12.00893939,12.359278863,10.710153118,12.506738544,11.654064016,12.29952319,11.871357652,11.44368573,11.666159843,11.297189895,9.2086485904,9.8874230904,10.710153118,11.374663073,11.654064016,10.999133073,10.79214332,12.793176972,9.9521742736,11.183650298,2.8002907994,2.4718557726,0,1.1320754717,0,1.300390117,1.079214332,-1.349491242,1.7139855693,0.1135395969,-0.053851746,-0.053735995,-0.053819865,0,0.3794346424,0.1625487646,0.2158428664,0.1079592993,0.1658695712,0.1135395969,7.4853927139,-8.490287219,3.0139124351,-7.277628032,-5.257880044,4.2262678804,1.349017915,-2.051226688,-47.10695823,-7.323304002,7.4315409677,-8.544023214,2.9600925702,-7.277628032,-4.878445402,4.388816645,1.5648607814,-1.943267388,-46.94108866,-7.209764405 +050,2,4,29,165,Missouri,Platte County,89322,89331,89714,90912,92203,93435,94947,96552,98771,101256,102953,104726,106532,383,1198,1291,1232,1512,1605,2219,2485,1697,1773,1806,279,1149,1140,1174,1102,1165,1235,1202,1211,1216,1214,159,576,586,612,630,633,699,731,759,699,767,120,573,554,562,472,532,536,471,452,517,447,43,139,164,160,195,296,202,287,239,225,187,216,487,577,519,841,780,1480,1723,1008,1030,1175,259,626,741,679,1036,1076,1682,2010,1247,1255,1362,4,-1,-4,-9,4,-3,1,4,-2,1,-3,869,869,869,869,869,869,869,869,869,869,869,869,12.722420914,12.451191874,12.648272444,11.6996316,12.167165364,12.645720166,12.018377519,11.860397926,11.710379961,11.493055884,6.3778193616,6.4003495071,6.5934776285,6.6885371214,6.6110005796,7.1573752195,7.3090132832,7.4335607148,6.7315424285,7.2612634788,6.3446015524,6.0508423668,6.0547948157,5.0110944782,5.5561647842,5.4883449466,4.7093642358,4.4268372109,4.9788375329,4.2317924055,1.5390918251,1.7912240941,1.7237850009,2.07026149,3.0913999551,2.0683688045,2.8696126023,2.3407391447,2.1668055027,1.7703471585,5.3923576894,6.3020506239,5.5915275967,8.9286662208,8.1462566384,15.1543853,17.227674264,9.8722387358,9.9191540791,11.123839097,6.9314495145,8.0932747181,7.3153125976,10.998927711,11.237656594,17.222754105,20.097286866,12.212977881,12.085959582,12.894186256 +050,2,4,29,167,Missouri,Polk County,31137,31130,31158,31203,31088,31126,31130,31272,31415,31776,32244,32228,32490,28,45,-115,38,4,142,143,361,468,-16,262,78,393,389,356,413,359,383,382,405,431,425,60,347,363,342,332,339,311,393,381,383,429,18,46,26,14,81,20,72,-11,24,48,-4,6,17,8,5,-1,-9,-3,-4,-7,-5,-4,6,-17,-149,23,-72,135,76,377,450,-59,270,12,0,-141,28,-73,126,73,373,443,-64,266,-2,-1,0,-4,-4,-4,-2,-1,1,0,0,1511,1511,1511,1511,1511,1513,1512,1512,1512,1513,1514,1514,12.604031366,12.489765777,11.444369435,13.267797481,11.506041473,12.219439437,12.090329319,12.652296157,13.370145179,13.133904014,11.128750341,11.654974234,10.994309962,10.665638653,10.865036377,9.9223124412,12.438480163,11.902530459,11.881126691,13.257517229,1.475281025,0.8347915429,0.4500594721,2.6021588281,0.641005096,2.297126996,-0.348150844,0.7497656982,1.4890184886,-0.123613214,0.5452125527,0.2568589363,0.1607355258,-0.032125418,-0.288452293,-0.095713625,-0.126600307,-0.218681662,-0.155106093,-0.123613214,-0.545212553,-4.783997688,0.7393834185,-2.313030069,4.3267843979,2.4247451625,11.932078935,14.058106842,-1.830251892,8.3438919621,0,-4.527138752,0.9001189443,-2.345155487,4.0383321047,2.3290315376,11.805478628,13.83942518,-1.985357985,8.2202787478 +050,2,4,29,169,Missouri,Pulaski County,52274,52282,52865,53322,53521,54151,53648,53324,52554,51918,51982,52634,52709,583,457,199,630,-503,-324,-770,-636,64,652,75,216,904,794,861,817,807,766,768,717,711,725,41,267,324,280,318,328,299,345,336,306,340,175,637,470,581,499,479,467,423,381,405,385,147,192,807,398,291,483,204,96,-47,31,25,241,-372,-1108,-349,-1322,-1303,-1450,-1160,-269,212,-337,388,-180,-301,49,-1031,-820,-1246,-1064,-316,243,-312,20,0,30,0,29,17,9,5,-1,4,2,9989,10007,10010,10139,10247,10096,10110,9899,9963,9982,10020,10019,17.026566341,14.862929719,15.993015826,15.157840054,15.088060427,14.469483745,14.70250402,13.801732435,13.592567103,13.764559582,5.0288641736,6.0649738401,5.2009807564,5.899869201,6.1324458737,5.6480099737,6.6046404778,6.4677574591,5.8499655884,6.4551038038,11.997702167,8.7979558792,10.792035069,9.2579708532,8.9556145533,8.8214737717,8.0978635424,7.3339749759,7.7426015141,7.3094557778,3.6162618776,15.106277435,7.3928226466,5.3989369104,9.0304004786,3.8534917547,1.8378130025,-0.904716073,0.5926435727,0.4746399856,-7.006507388,-20.74071301,-6.482651014,-24.52712919,-24.36151516,-27.39001492,-22.20690711,-5.178055823,4.0529173358,-6.398147005,-3.39024551,-5.634435574,0.9101716324,-19.12819228,-15.33111468,-23.53652317,-20.36909411,-6.082771896,4.6455609085,-5.92350702 +050,2,4,29,171,Missouri,Putnam County,4979,4979,4974,4977,4948,4887,4845,4864,4825,4782,4748,4688,4688,-5,3,-29,-61,-42,19,-39,-43,-34,-60,0,16,51,55,49,57,66,59,64,56,53,53,12,54,70,70,60,59,72,84,59,68,72,4,-3,-15,-21,-3,7,-13,-20,-3,-15,-19,0,0,0,0,-2,0,0,0,0,0,0,-9,7,-13,-41,-36,12,-26,-21,-31,-45,19,-9,7,-13,-41,-38,12,-26,-21,-31,-45,19,0,-1,-1,1,-1,0,0,-2,0,0,0,57,57,57,57,57,57,57,57,57,57,57,57,10.250226108,11.083123426,9.9644128114,11.713933416,13.595632918,12.178759418,13.323618195,11.752360965,11.233573548,11.305460751,10.853180585,14.105793451,14.234875445,12.330456227,12.153671851,14.862214883,17.487248881,12.381951731,14.412886816,15.358361775,-0.602954477,-3.022670025,-4.270462633,-0.616522811,1.4419610671,-2.683455465,-4.163630686,-0.629590766,-3.179313268,-4.052901024,0,0,0,-0.411015208,0,0,0,0,0,0,1.4068937795,-2.619647355,-8.337569903,-7.398273736,2.4719332578,-5.36691093,-4.37181222,-6.505771249,-9.537939805,4.0529010239,1.4068937795,-2.619647355,-8.337569903,-7.809288944,2.4719332578,-5.36691093,-4.37181222,-6.505771249,-9.537939805,4.0529010239 +050,2,4,29,173,Missouri,Ralls County,10167,10178,10196,10278,10230,10168,10280,10171,10240,10228,10233,10292,10299,18,82,-48,-62,112,-109,69,-12,5,59,7,35,101,90,98,97,90,100,100,117,84,91,31,84,74,123,87,106,101,104,86,87,95,4,17,16,-25,10,-16,-1,-4,31,-3,-4,0,0,0,0,0,0,0,0,0,0,0,16,64,-64,-36,101,-92,70,-7,-26,61,12,16,64,-64,-36,101,-92,70,-7,-26,61,12,-2,1,0,-1,1,-1,0,-1,0,1,-1,54,54,54,54,54,54,54,54,54,54,54,54,9.86617173,8.7770626097,9.608785175,9.4874804382,8.8015255978,9.7986379893,9.7713504006,11.436391183,8.1851400731,8.8388130737,8.2055289636,7.2166959235,12.060005883,8.5093896714,10.36624126,9.8966243692,10.162204417,8.4062362543,8.4774665043,9.2273323297,1.6606427664,1.5603666862,-2.451220708,0.9780907668,-1.564715662,-0.09798638,-0.390854016,3.0301549289,-0.292326431,-0.388519256,0,0,0,0,0,0,0,0,0,0,6.2518315913,-6.241466745,-3.529757819,9.8787167449,-8.997115055,6.8590465925,-0.683994528,-2.541420263,5.9439707674,1.165557768,6.2518315913,-6.241466745,-3.529757819,9.8787167449,-8.997115055,6.8590465925,-0.683994528,-2.541420263,5.9439707674,1.165557768 +050,2,4,29,175,Missouri,Randolph County,25414,25415,25454,25283,25337,24953,25063,25063,24992,24909,24697,24839,24409,39,-171,54,-384,110,0,-71,-83,-212,142,-430,83,282,269,282,292,267,290,291,300,296,287,43,243,271,304,276,301,272,317,271,284,269,40,39,-2,-22,16,-34,18,-26,29,12,18,0,6,6,6,4,11,0,4,3,3,3,1,-218,52,-377,91,26,-87,-60,-246,127,-449,1,-212,58,-371,95,37,-87,-56,-243,130,-446,-2,2,-2,9,-1,-3,-2,-1,2,0,-2,2455,2455,2352,2455,2270,2455,2457,2458,2450,2256,2466,2279,11.116147979,10.628210194,11.214953271,11.676263596,10.653154052,11.587254021,11.663092924,12.095311051,11.950904393,11.655295647,9.5788083647,10.707230344,12.089878704,11.03646833,12.009735467,10.86804515,12.705156209,10.926097649,11.466408269,10.924301494,1.5373396141,-0.07902015,-0.874925432,0.6397952655,-1.356581415,0.7192088702,-1.042063285,1.1692134016,0.484496124,0.730994152,0.2365137868,0.2370604504,0.238616027,0.1599488164,0.4388939872,0,0.1603174285,0.1209531105,0.121124031,0.1218323587,-8.593334253,2.0545239036,-14.99304037,3.6388355726,1.0373857878,-3.476176206,-2.404761428,-9.918155062,5.1275839793,-18.23424301,-8.356820466,2.291584354,-14.75442434,3.798784389,1.476279775,-3.476176206,-2.244443999,-9.797201951,5.2487080103,-18.11241066 +050,2,4,29,177,Missouri,Ray County,23494,23516,23517,23345,23081,23065,22939,22799,22740,22895,22924,23024,22915,1,-172,-264,-16,-126,-140,-59,155,29,100,-109,56,257,236,247,234,271,249,266,255,269,256,32,238,244,246,261,242,267,269,296,246,287,24,19,-8,1,-27,29,-18,-3,-41,23,-31,1,-1,1,2,2,-1,1,3,2,1,2,-23,-191,-266,-17,-99,-169,-41,157,68,77,-81,-22,-192,-265,-15,-97,-170,-40,160,70,78,-79,-1,1,9,-2,-2,1,-1,-2,0,-1,1,311,311,311,311,311,311,311,311,311,311,311,311,10.968375229,10.166716926,10.705153209,10.173028432,11.850102759,10.935681504,11.657718856,11.130753617,11.708888309,11.145214306,10.157483675,10.511351398,10.661812508,11.346839405,10.582010582,11.726212697,11.789196888,12.920404199,10.707756594,12.494830101,0.8108915539,-0.344634472,0.0433407013,-1.173810973,1.2680921772,-0.790531193,-0.131478032,-1.789650582,1.0011317141,-1.349615795,-0.042678503,0.043079309,0.0866814025,0.086948961,-0.043727316,0.0439183996,0.1314780322,0.0873000284,0.0435274658,0.0870719868,-8.151594042,-11.4590962,-0.736791921,-4.303973568,-7.389916481,-1.800654384,6.8806836858,2.9682009647,3.351614869,-3.526415464,-8.194272545,-11.41601689,-0.650110519,-4.217024607,-7.433643797,-1.756735985,7.012161718,3.055500993,3.3951423348,-3.439343477 +050,2,4,29,179,Missouri,Reynolds County,6696,6690,6676,6565,6549,6456,6402,6294,6359,6260,6267,6288,6198,-14,-111,-16,-93,-54,-108,65,-99,7,21,-90,13,68,59,69,58,52,65,46,63,70,67,32,92,69,82,100,101,82,76,90,78,99,-19,-24,-10,-13,-42,-49,-17,-30,-27,-8,-32,0,0,0,0,0,0,0,0,0,0,0,7,-86,-6,-81,-12,-57,82,-69,34,29,-57,7,-86,-6,-81,-12,-57,82,-69,34,29,-57,-2,-1,0,1,0,-2,0,0,0,0,-1,101,101,101,101,101,101,101,101,101,101,101,101,10.271127558,8.998017386,10.611303345,9.0216207808,8.1915563957,10.274243262,7.2905935494,10.058274128,11.150935882,10.732019862,13.896231402,10.523105079,12.61053441,15.554518588,15.910522999,12.961353039,12.045328473,14.36896304,12.425328554,15.857760692,-3.625103844,-1.525087693,-1.999231065,-6.532897807,-7.718966604,-2.687109776,-4.754734924,-4.310688912,-1.274392672,-5.12574083,0,0,0,0,0,0,0,0,0,0,-12.98995544,-0.915052616,-12.4567474,-1.866542231,-8.979206049,12.961353039,-10.93589032,5.4282749262,4.6196734369,-9.130225853,-12.98995544,-0.915052616,-12.4567474,-1.866542231,-8.979206049,12.961353039,-10.93589032,5.4282749262,4.6196734369,-9.130225853 +050,2,4,29,181,Missouri,Ripley County,14100,14106,14102,14143,14032,13996,13941,13797,13773,13576,13428,13343,13300,-4,41,-111,-36,-55,-144,-24,-197,-148,-85,-43,48,190,172,175,183,186,161,158,153,160,154,70,181,180,196,179,171,201,167,209,175,221,-22,9,-8,-21,4,15,-40,-9,-56,-15,-67,0,-1,-2,1,-1,-1,-1,-2,-2,-2,-2,18,34,-100,-13,-56,-159,20,-187,-89,-68,27,18,33,-102,-12,-57,-160,19,-189,-91,-70,25,0,-1,-1,-3,-2,1,-3,1,-1,0,-1,63,63,63,63,63,63,63,63,63,63,63,63,13.453708621,12.209405501,12.487512488,13.100905609,13.411204845,11.679361625,11.554352993,11.33165457,11.953232976,11.560259731,12.816427686,12.777284827,13.986013986,12.814547017,12.329656067,14.581066376,12.21251234,15.479188268,13.073848567,16.589723379,0.6372809347,-0.567879326,-1.498501499,0.2863585925,1.0815487778,-2.901704752,-0.658159348,-4.147533699,-1.120615591,-5.029463649,-0.070808993,-0.141969831,0.0713572142,-0.071589648,-0.072103252,-0.072542619,-0.146257633,-0.148126204,-0.149415412,-0.150133243,2.4075057532,-7.098491571,-0.927643785,-4.009020296,-11.46441705,1.4508523758,-13.67508867,-6.591616057,-5.080124015,2.0267987839,2.3366967605,-7.240461402,-0.856286571,-4.080609944,-11.5365203,1.378309757,-13.8213463,-6.73974226,-5.229539427,1.8766655407 +050,2,4,29,183,Missouri,St. Charles County,360485,360488,361808,365614,369175,374378,379956,385108,390724,395153,398656,401625,406204,1320,3806,3561,5203,5578,5152,5616,4429,3503,2969,4579,1209,4611,4395,4550,4572,4475,4597,4481,4379,4303,4254,532,2250,2360,2410,2576,2759,2711,2986,3037,3112,3274,677,2361,2035,2140,1996,1716,1886,1495,1342,1191,980,109,546,436,401,525,591,418,546,450,365,326,536,912,1171,2668,3039,2858,3313,2405,1721,1411,3271,645,1458,1607,3069,3564,3449,3731,2951,2171,1776,3597,-2,-13,-81,-6,18,-13,-1,-17,-10,2,2,5426,5426,5426,5430,5434,5433,5439,5441,5447,5450,5450,5452,12.677647913,11.96261784,12.238535787,12.121951284,11.698367718,11.850503717,11.403820191,11.032880706,10.753722755,10.531931882,6.1862302762,6.423612765,6.482389285,6.8298658154,7.2124684994,6.9886264037,7.5991535571,7.6517147072,7.7772682345,8.1056758299,6.4914176365,5.5390050749,5.756146502,5.2920854688,4.4858992189,4.8618773136,3.8046666336,3.3811659984,2.9764545203,2.4262560517,1.5011918804,1.1867352396,1.0786050221,1.3919563482,1.5449687869,1.0775528723,1.3895304227,1.1337739935,0.9121795969,0.8071015029,2.5074853386,3.1873095542,7.1763546109,8.0574387473,7.4712703774,8.5405087699,6.1205506714,4.3360556507,3.5262614007,8.0982485155,4.008677219,4.3740447938,8.254959633,9.4493950955,9.0162391643,9.6180616422,7.5100810941,5.4698296442,4.4384409976,8.9053500184 +050,2,4,29,185,Missouri,St. Clair County,9805,9805,9823,9694,9533,9499,9446,9427,9310,9395,9431,9450,9689,18,-129,-161,-34,-53,-19,-117,85,36,19,239,25,95,87,88,98,94,100,96,110,90,92,48,124,145,147,137,155,160,143,131,127,152,-23,-29,-58,-59,-39,-61,-60,-47,-21,-37,-60,0,-1,0,-1,-1,-1,2,2,1,1,1,40,-100,-105,27,-11,44,-58,130,58,56,301,40,-101,-105,26,-12,43,-56,132,59,57,302,1,1,2,-1,-2,-1,-1,0,-2,-1,-3,207,207,207,207,207,207,207,207,207,207,207,207,9.735102731,9.0497737557,9.2475830181,10.345737662,9.9613204048,10.674067353,10.264635124,11.685966217,9.5333933584,9.6138774231,12.706870933,15.082956259,15.447667087,14.462918976,16.425581519,17.078507765,15.290029404,13.916923404,13.452677295,15.883797482,-2.971768202,-6.033182504,-6.200084069,-4.117181314,-6.464261114,-6.404440412,-5.02539428,-2.230957187,-3.919283936,-6.269920059,-0.102474766,0,-0.105086171,-0.105568752,-0.105971494,0.2134813471,0.2138465651,0.1062360565,0.1059265929,0.1044986676,-10.24747656,-10.92214074,2.8373266078,-1.161256268,4.6627457214,-6.190959065,13.900026731,6.161691278,5.9318892008,31.45409896,-10.34995132,-10.92214074,2.7322404372,-1.26682502,4.5567742277,-5.977477718,14.113873296,6.2679273345,6.0378157937,31.558597628 +050,2,4,29,186,Missouri,Ste. Genevieve County,18145,18147,18126,18196,17867,17951,17936,17805,17867,17797,17890,17957,17924,-21,70,-329,84,-15,-131,62,-70,93,67,-33,45,194,149,160,190,193,166,193,198,226,209,55,185,203,190,173,217,159,215,223,185,202,-10,9,-54,-30,17,-24,7,-22,-25,41,7,0,32,36,40,22,2,1,1,1,1,1,-9,28,-319,75,-51,-108,55,-47,119,26,-41,-9,60,-283,115,-29,-106,56,-46,120,27,-40,-2,1,8,-1,-3,-1,-1,-2,-2,-1,0,277,277,277,277,277,277,277,277,277,277,277,277,10.682231155,8.2633169731,8.9340555028,10.588792599,10.799921659,9.3070195111,10.823239121,11.096477709,12.609144419,11.649619576,10.18666373,11.258076145,10.60919091,9.6413743138,12.142917098,8.9145548329,12.056976223,12.497548127,10.321644768,11.25944093,0.4955674247,-2.994759171,-1.675135407,0.9474182852,-1.342995439,0.3924646782,-1.233737102,-1.401070418,2.2874996513,0.3901786461,1.76201751,1.9965061143,2.2335138757,1.226070722,0.1119162866,0.0560663826,0.0560789592,0.0560428167,0.0557926744,0.0557398066,1.5417653213,-17.69126251,4.1878385169,-2.842254856,-6.043479477,3.0836510428,-2.635711081,6.6690951887,1.450609535,-2.28533207,3.3037828313,-15.6947564,6.4213523927,-1.616184134,-5.931563191,3.1397174254,-2.579632122,6.7251380054,1.5064022094,-2.229592263 +050,2,4,29,187,Missouri,St. Francois County,65359,65369,65534,65596,65811,66118,65801,66253,66395,66702,66740,66942,66485,165,62,215,307,-317,452,142,307,38,202,-457,196,735,753,751,738,717,723,702,720,680,678,188,741,732,794,746,791,764,775,804,780,836,8,-6,21,-43,-8,-74,-41,-73,-84,-100,-158,3,13,9,-2,-3,10,-4,1,-3,-1,-3,148,58,193,351,-301,514,190,381,127,303,-296,151,71,202,349,-304,524,186,382,124,302,-299,6,-3,-8,1,-5,2,-3,-2,-2,0,0,6652,6675,6722,6824,7042,6879,6979,6994,7107,7009,6778,6279,11.210249371,11.460576682,11.384911581,11.188683965,10.859193966,10.901031301,10.548697566,10.791205168,10.173396568,10.16286059,11.301761611,11.140959005,12.036777358,11.309970512,11.979947597,11.519208733,11.6456419,12.050179104,11.669484299,12.531196834,-0.09151224,0.3196176764,-0.651865776,-0.121286547,-1.120753631,-0.618177432,-1.096944334,-1.258973936,-1.496087731,-2.368336244,0.1982765195,0.1369790042,-0.030319338,-0.045482455,0.1514531934,-0.060309993,0.0150266347,-0.044963355,-0.014960877,-0.04496841,0.8846183177,2.9374386448,5.3210438948,-4.563406333,7.7846941403,2.8647246849,5.7251478245,1.9034486893,4.5331458237,-4.43688309,1.0828948372,3.074417649,5.2907245564,-4.608888788,7.9361473337,2.8044146915,5.7401744592,1.8584853345,4.5181849464,-4.481851499 +050,2,4,29,189,Missouri,St. Louis County,998954,998961,998846,1000147,1000975,1000746,1000903,1001585,998393,997116,995900,995467,994020,-115,1301,828,-229,157,682,-3192,-1277,-1216,-433,-1447,2842,11830,11762,11338,11715,11843,11570,11539,11358,11434,11261,2224,9284,9262,9536,9316,10078,9857,10113,10838,10425,10827,618,2546,2500,1802,2399,1765,1713,1426,520,1009,434,465,2453,1572,1534,1900,2695,1850,2659,2030,2038,1580,-1191,-3685,-3159,-3519,-4073,-3728,-6764,-5368,-3759,-3497,-3489,-726,-1232,-1587,-1985,-2173,-1033,-4914,-2709,-1729,-1459,-1909,-7,-13,-85,-46,-69,-50,9,6,-7,17,28,19454,19454,19441,19439,19403,19410,19410,19391,19385,19317,19256,19110,11.835959406,11.755405218,11.328252039,11.70534894,11.828285613,11.570127271,11.564969138,11.397801122,11.483568825,11.320506241,9.2886768488,9.2568069313,9.527801327,9.3083252858,10.065478545,9.8571084282,10.135759849,10.875978918,10.470194595,10.884212865,2.5472825568,2.4985982864,1.8004507122,2.397023654,1.762807068,1.7130188432,1.4292092895,0.5218222031,1.0133742299,0.4362933761,2.4542357077,1.5711186025,1.5326811279,1.8984347406,2.6916515854,1.8500203502,2.6649842221,2.0371136007,2.046835164,1.5883491573,-3.686856332,-3.157228795,-3.515974504,-4.069644578,-3.72336813,-6.764074405,-5.380080972,-3.772172426,-3.51216024,-3.507436842,-1.232620624,-1.586110192,-1.983293376,-2.171209837,-1.031716545,-4.914054055,-2.71509675,-1.735058825,-1.465325076,-1.919087684 +050,2,4,29,195,Missouri,Saline County,23370,23372,23422,23409,23547,23362,23408,23241,23126,22940,22907,22827,22858,50,-13,138,-185,46,-167,-115,-186,-33,-80,31,73,309,326,304,304,271,263,231,236,268,256,37,244,262,253,284,244,255,269,262,237,259,36,65,64,51,20,27,8,-38,-26,31,-3,11,52,31,20,24,72,44,69,55,63,48,6,-130,48,-261,6,-269,-168,-217,-60,-173,-15,17,-78,79,-241,30,-197,-124,-148,-5,-110,33,-3,0,-5,5,-4,3,1,0,-2,-1,1,1484,1484,1484,1484,1485,1484,1485,1487,1488,1489,1490,1491,13.196387009,13.885339467,12.961265429,12.999786188,11.618684216,11.344275023,10.029088699,10.295112003,11.719945773,11.207179599,10.420447994,11.159383252,10.78684261,12.144537096,10.461103132,10.999202019,11.678895498,11.429319258,10.364280404,11.338513735,2.7759390148,2.7259562143,2.1744228186,0.8552490913,1.1575810843,0.3450730045,-1.649806799,-1.134207255,1.3556653693,-0.131334136,2.2207512118,1.3203850413,0.8527148308,1.0262989096,3.0868828914,1.8979015248,2.9957018191,2.399284577,2.7550618796,2.1013461749,-5.55187803,2.0444671607,-11.12792854,0.2565747274,-11.53293747,-7.246533095,-9.421265141,-2.617401357,-7.565487384,-0.65667068,-3.331126818,3.3648522021,-10.27521371,1.2828736369,-8.446054578,-5.34863157,-6.425563322,-0.21811678,-4.810425504,1.4446754952 +050,2,4,29,197,Missouri,Schuyler County,4431,4431,4441,4390,4391,4375,4397,4506,4496,4513,4577,4632,4534,10,-51,1,-16,22,109,-10,17,64,55,-98,18,57,63,60,69,64,63,81,69,65,65,11,49,47,52,71,49,49,55,55,45,48,7,8,16,8,-2,15,14,26,14,20,17,0,0,-1,0,3,5,-1,2,1,2,0,3,-60,-13,-24,21,89,-22,-11,48,34,-115,3,-60,-14,-24,24,94,-23,-9,49,36,-115,0,1,-1,0,0,0,-1,0,1,-1,0,47,47,47,47,47,47,47,47,47,47,47,47,12.90907032,14.349162965,13.689253936,15.731874145,14.377176233,13.99688958,17.982017982,15.181518152,14.116625041,14.182849662,11.097270977,10.704931101,11.864020078,16.187870497,11.007525553,10.886469673,12.21001221,12.101210121,9.7730481051,10.473488981,1.8117993432,3.6442318643,1.8252338581,-0.455996352,3.3696506795,3.1104199067,5.772005772,3.0803080308,4.3435769356,3.7093606808,0,-0.227764492,0,0.683994528,1.1232168932,-0.22217285,0.444000444,0.2200220022,0.4343576936,0,-13.58849507,-2.96093839,-5.475701574,4.7879616963,19.993260699,-4.887802711,-2.442002442,10.561056106,7.3840807905,-25.09273402,-13.58849507,-3.188702881,-5.475701574,5.4719562244,21.116477592,-5.109975561,-1.998001998,10.781078108,7.8184384841,-25.09273402 +050,2,4,29,199,Missouri,Scotland County,4843,4854,4841,4839,4872,4902,4851,4833,4915,4958,4937,4936,4871,-13,-2,33,30,-51,-18,82,43,-21,-1,-65,22,69,85,73,83,62,97,96,69,81,72,31,56,53,58,50,66,72,59,50,28,45,-9,13,32,15,33,-4,25,37,19,53,27,0,-1,-1,0,0,0,0,0,0,0,0,-5,-13,2,17,-87,-12,55,5,-40,-54,-90,-5,-14,1,17,-87,-12,55,5,-40,-54,-90,1,-1,0,-2,3,-2,2,1,0,0,-2,76,76,76,76,76,76,76,76,76,76,76,76,14.256198347,17.50592112,14.937589523,17.020403978,12.804626188,19.90151826,19.446976603,13.946437595,16.408386509,14.683389416,11.570247934,10.915456699,11.868221813,10.253255409,13.630731103,14.772260977,11.951787704,10.106114199,5.6720348425,9.1771183848,2.6859504132,6.5904644218,3.0693677103,6.7671485697,-0.826104915,5.1292572835,7.495188899,3.8403233957,10.736351666,5.5062710309,-0.20661157,-0.205952013,0,0,0,0,0,0,0,0,-2.685950413,0.4119040264,3.4786167383,-17.84066441,-2.478314746,11.284366024,1.0128633647,-8.084891359,-10.93892434,-18.35423677,-2.892561983,0.2059520132,3.4786167383,-17.84066441,-2.478314746,11.284366024,1.0128633647,-8.084891359,-10.93892434,-18.35423677 +050,2,4,29,201,Missouri,Scott County,39191,39204,39268,39159,39177,39228,38897,39040,38781,38611,38596,38416,38288,64,-109,18,51,-331,143,-259,-170,-15,-180,-128,120,556,501,534,509,505,465,469,527,485,488,76,416,410,457,434,438,436,444,470,424,495,44,140,91,77,75,67,29,25,57,61,-7,6,8,19,2,5,7,3,6,10,-4,-1,19,-255,-87,-21,-414,73,-290,-200,-82,-237,-121,25,-247,-68,-19,-409,80,-287,-194,-72,-241,-122,-5,-2,-5,-7,3,-4,-1,-1,0,0,1,559,559,559,559,559,559,559,559,559,559,559,559,14.178790468,12.791053922,13.621580256,13.0304,12.959184983,11.950501793,12.120115774,13.6516119,12.595439672,12.724238632,10.608591429,10.467728758,11.657419807,11.1104,11.239847569,11.205201681,11.474054166,12.175061847,11.011270971,12.906758448,3.5701990386,2.3233251634,1.964160449,1.92,1.7193374136,0.7453001118,0.6460616084,1.4765500538,1.584168701,-0.182519816,0.2040113736,0.4850898693,0.0510171545,0.128,0.1796322671,0.0771000116,0.155054786,0.2590438691,-0.103879915,-0.026074259,-6.502862535,-2.22120098,-0.535680122,-10.5984,1.8733079282,-7.453001118,-5.168492867,-2.124159726,-6.154884953,-3.154985398,-6.298851161,-1.736111111,-0.484662968,-10.4704,2.0529401953,-7.375901106,-5.013438081,-1.865115857,-6.258764868,-3.181059658 +050,2,4,29,203,Missouri,Shannon County,8441,8437,8445,8414,8333,8289,8295,8275,8225,8238,8192,8177,8203,8,-31,-81,-44,6,-20,-50,13,-46,-15,26,29,98,95,92,80,89,85,92,99,88,88,10,93,90,101,91,90,100,83,102,97,106,19,5,5,-9,-11,-1,-15,9,-3,-9,-18,1,1,0,0,0,0,0,0,0,0,0,-11,-37,-86,-35,18,-18,-36,5,-42,-6,43,-10,-36,-86,-35,18,-18,-36,5,-42,-6,43,-1,0,0,0,-1,-1,1,-1,-1,0,1,80,80,80,80,80,80,80,80,80,80,80,80,11.625837831,11.345315579,11.069666707,9.6478533526,10.742305371,10.303030303,11.17657778,12.051125989,10.752031279,10.744810745,11.03268284,10.748193706,12.152568885,10.974433189,10.863005432,12.121212121,10.083216911,12.416311625,11.851670841,12.942612943,0.5931549914,0.5971218726,-1.082902178,-1.326579836,-0.12070006,-1.818181818,1.0933608698,-0.365185636,-1.099639563,-2.197802198,0.1186309983,0,0,0,0,0,0,0,0,0,-4.389346936,-10.27049621,-4.211286247,2.1707670043,-2.172601086,-4.363636364,0.6074227055,-5.112598904,-0.733093042,5.2503052503,-4.270715938,-10.27049621,-4.211286247,2.1707670043,-2.172601086,-4.363636364,0.6074227055,-5.112598904,-0.733093042,5.2503052503 +050,2,4,29,205,Missouri,Shelby County,6373,6372,6364,6232,6213,6150,6089,6099,6035,5992,6004,5923,5919,-8,-132,-19,-63,-61,10,-64,-43,12,-81,-4,23,62,88,59,72,76,69,90,71,74,73,27,94,86,68,82,92,90,89,84,66,59,-4,-32,2,-9,-10,-16,-21,1,-13,8,14,0,0,0,1,1,2,2,1,2,1,0,-4,-101,-20,-54,-52,26,-46,-45,24,-91,-18,-4,-101,-20,-53,-51,28,-44,-44,26,-90,-18,0,1,-1,-1,0,-2,1,0,-1,1,0,198,198,198,198,198,198,198,198,198,198,198,198,9.844395046,14.142225793,9.5446089137,11.76566713,12.471283229,11.373001483,14.966325767,11.837279093,12.408820324,12.32899848,14.925373134,13.820811571,11.000566206,13.399787564,15.096816541,14.834349761,14.800033259,14.004668223,11.067326235,9.9645330181,-5.080978088,0.3214142226,-1.455957292,-1.634120435,-2.625533311,-3.461348278,0.1662925085,-2.16738913,1.341494089,2.3644654619,0,0,0.1617730324,0.1634120435,0.3281916639,0.3296522169,0.1662925085,0.3334444815,0.1676867611,0,-16.03683709,-3.214142226,-8.735743752,-8.49742626,4.2664916311,-7.582000989,-7.483162884,4.0013337779,-15.25949526,-3.040027022,-16.03683709,-3.214142226,-8.573970719,-8.334014217,4.594683295,-7.252348772,-7.316870375,4.3347782594,-15.0918085,-3.040027022 +050,2,4,29,207,Missouri,Stoddard County,29968,29968,30025,29850,29816,29802,29794,29751,29504,29384,29288,29096,29001,57,-175,-34,-14,-8,-43,-247,-120,-96,-192,-95,80,366,355,381,388,367,314,315,350,336,334,78,382,398,365,365,419,396,392,404,390,409,2,-16,-43,16,23,-52,-82,-77,-54,-54,-75,1,1,1,-2,0,2,0,2,2,2,1,56,-160,15,-24,-24,11,-164,-43,-42,-141,-21,57,-159,16,-26,-24,13,-164,-41,-40,-139,-20,-2,0,-7,-4,-7,-4,-1,-2,-2,1,0,689,689,687,688,688,689,690,690,689,689,690,689,12.225469729,11.899574297,12.781374753,13.021008121,12.326811655,10.59826175,10.698274691,11.93073357,11.51000274,11.498011946,12.759916493,13.340931184,12.244624107,12.249144238,14.073389873,13.365960678,13.313408504,13.77147532,13.359824609,14.079900855,-0.534446764,-1.441356887,0.5367506458,0.7718638835,-1.746578218,-2.767698928,-2.615133813,-1.840741751,-1.849821869,-2.58188891,0.0334029228,0.0335199276,-0.067093831,0,0.0671760853,0,0.0679255536,0.0681756204,0.0685119211,0.0344251855,-5.344467641,0.502798914,-0.805125969,-0.805423183,0.3694684692,-5.535397857,-1.460399402,-1.431688028,-4.830090436,-0.722928895,-5.311064718,0.5363188416,-0.872219799,-0.805423183,0.4366445545,-5.535397857,-1.392473849,-1.363512408,-4.761578515,-0.688503709 +050,2,4,29,209,Missouri,Stone County,32202,32211,32241,32130,31908,31672,31462,31334,31503,31676,31729,32002,32465,30,-111,-222,-236,-210,-128,169,173,53,273,463,86,241,269,233,265,231,242,263,262,258,260,64,334,342,386,436,403,390,381,459,405,432,22,-93,-73,-153,-171,-172,-148,-118,-197,-147,-172,2,5,6,1,9,10,4,-1,-4,-3,-1,10,-22,-150,-76,-42,34,316,291,255,427,643,12,-17,-144,-75,-33,44,320,290,251,424,642,-4,-1,-5,-8,-6,0,-3,1,-1,-4,-7,300,300,300,300,300,300,300,300,300,300,300,300,7.4878439049,8.4012617508,7.3293488518,8.3948427155,7.3571565068,7.702468291,8.3255512116,8.2643324659,8.0965307307,8.0661423674,10.377343835,10.681158062,12.142183076,13.811892166,12.835212434,12.413068733,12.060969626,14.478353442,12.709670333,13.40220578,-2.88949993,-2.279896312,-4.812834225,-5.41704945,-5.478055927,-4.710600442,-3.735418414,-6.214020976,-4.613139602,-5.336063412,0.1553494586,0.1873887379,0.0314564328,0.2851078658,0.3184916237,0.1273135255,-0.031656088,-0.126173015,-0.094145706,-0.031023624,-0.683537618,-4.684718448,-2.390688896,-1.330503374,1.0828715205,10.057768512,9.2119216828,8.0435296901,13.400072178,19.948190547,-0.528188159,-4.49732971,-2.359232463,-1.045395508,1.4013631441,10.185082038,9.1802655946,7.9173566753,13.305926472,19.917166923 +050,2,4,29,211,Missouri,Sullivan County,6714,6714,6737,6665,6557,6499,6476,6369,6328,6203,6189,6061,6033,23,-72,-108,-58,-23,-107,-41,-125,-14,-128,-28,27,81,91,86,82,85,82,84,82,97,93,9,77,82,77,97,74,58,68,79,73,71,18,4,9,9,-15,11,24,16,3,24,22,0,13,22,19,22,20,18,16,16,11,11,5,-90,-141,-90,-28,-139,-83,-158,-32,-163,-62,5,-77,-119,-71,-6,-119,-65,-142,-16,-152,-51,0,1,2,4,-2,1,0,1,-1,0,1,108,108,108,108,108,108,108,108,108,108,108,108,12.087748097,13.764937226,13.174019608,12.639691715,13.234721682,12.916436954,13.406751257,13.234344739,15.836734694,15.379527038,11.490822265,12.403569808,11.795343137,14.951830443,11.521992993,9.1360163818,10.853084351,12.750161394,11.918367347,11.741359352,0.596925832,1.3613674179,1.3786764706,-2.312138728,1.7127286882,3.7804205718,2.5536669061,0.4841833441,3.9183673469,3.6381676865,1.9400089539,3.3277870216,2.9105392157,3.3911368015,3.1140521604,2.8353154288,2.5536669061,2.5823111685,1.7959183673,1.8190838432,-13.43083122,-21.32808955,-13.78676471,-4.315992293,-21.64266251,-13.07395448,-25.2174607,-5.164622337,-26.6122449,-10.25301803,-11.49082227,-18.00030253,-10.87622549,-0.924855491,-18.52861035,-10.23863905,-22.66379379,-2.582311168,-24.81632653,-8.433934182 +050,2,4,29,213,Missouri,Taney County,51675,51672,51905,52666,52928,53298,53861,54282,54663,55176,55817,56057,56104,233,761,262,370,563,421,381,513,641,240,47,147,611,617,624,628,660,634,641,616,664,627,116,484,489,558,531,572,600,591,666,573,602,31,127,128,66,97,88,34,50,-50,91,25,31,88,40,36,-3,44,21,27,22,10,11,162,545,104,270,460,298,329,435,669,140,11,193,633,144,306,457,342,350,462,691,150,22,9,1,-10,-2,9,-9,-3,1,0,-1,0,1744,1744,1744,1744,1744,1747,1750,1751,1754,1755,1756,1756,11.685840243,11.686270053,11.74853614,11.720900718,12.206060494,11.638900363,11.671628474,11.099799086,11.870497166,11.180356809,9.2568685391,9.2618898801,10.50590251,9.910506817,10.578585761,11.014732204,10.761205036,12.000756804,10.243666982,10.734569057,2.4289717034,2.4243801731,1.2426336302,1.8103939007,1.6274747325,0.6241681582,0.9104234379,-0.900957718,1.626830184,0.4457877515,1.6830670071,0.7576188041,0.6778001619,-0.055991564,0.8137373663,0.3855156272,0.4916286565,0.3964213959,0.1787725477,0.1961466107,10.423539987,1.9698088907,5.0835012144,8.5853731371,5.5112212533,6.0397448254,7.9206839101,12.054814268,2.5028156676,0.1961466107,12.106606994,2.7274276948,5.7613013763,8.5293815732,6.3249586196,6.4252604525,8.4123125666,12.451235664,2.6815882153,0.3922932214 +050,2,4,29,215,Missouri,Texas County,26008,26018,26043,25935,25799,25699,25680,25692,25844,25689,25560,25383,25112,25,-108,-136,-100,-19,12,152,-155,-129,-177,-271,70,296,283,301,298,290,304,283,302,255,263,90,280,277,293,301,316,309,295,327,307,321,-20,16,6,8,-3,-26,-5,-12,-25,-52,-58,1,10,5,0,-3,-2,-4,-2,-2,-2,0,43,-134,-147,-104,-7,44,162,-139,-101,-124,-212,44,-124,-142,-104,-10,42,158,-141,-103,-126,-212,1,0,0,-4,-6,-4,-1,-2,-1,1,-1,1897,1897,1882,1854,1896,1898,1908,1893,1885,1894,1827,1698,11.389433991,10.940580663,11.68977436,11.600070068,11.290196994,11.797578392,10.983253449,11.785595817,10.011188976,10.416872958,10.773788911,10.708624889,11.379082683,11.716849296,12.302421553,11.99161751,11.448974444,12.761224609,12.052686336,12.714130112,0.6156450806,0.2319557738,0.3106916773,-0.116779229,-1.012224558,-0.194039118,-0.465720994,-0.975628793,-2.04149736,-2.297257154,0.3847781754,0.1932964781,0,-0.116779229,-0.077863428,-0.155231295,-0.077620166,-0.078050303,-0.078519129,0,-5.15602755,-5.682916457,-4.038991806,-0.272484867,1.7129954061,6.2868674325,-5.394601517,-3.941540323,-4.868186012,-8.396870977,-4.771249375,-5.489619979,-4.038991806,-0.389264096,1.6351319785,6.1316361378,-5.472221683,-4.019590626,-4.946705141,-8.396870977 +050,2,4,29,217,Missouri,Vernon County,21159,21165,21160,21090,20937,20988,20996,20775,20689,20527,20544,20654,20388,-5,-70,-153,51,8,-221,-86,-162,17,110,-266,46,232,252,264,263,262,280,231,250,242,248,40,248,261,251,268,263,264,237,253,229,251,6,-16,-9,13,-5,-1,16,-6,-3,13,-3,12,65,31,8,6,9,5,6,5,5,3,-21,-119,-178,34,11,-229,-107,-163,17,92,-265,-9,-54,-147,42,17,-220,-102,-157,22,97,-262,-2,0,3,-4,-4,0,0,1,-2,0,-1,866,866,866,866,866,866,866,867,867,868,868,868,10.982248521,11.99229067,12.59391771,12.528582317,12.544588351,13.505691684,11.20923913,12.174040077,11.748143114,12.085181034,11.73964497,12.420586766,11.973762671,12.766768293,12.592468459,12.733937874,11.500388199,12.320128558,11.117044517,12.23137274,-0.75739645,-0.428296095,0.6201550388,-0.238185976,-0.047880108,0.7717538105,-0.291149068,-0.146088481,0.631098597,-0.146191706,3.0769230769,1.4752421063,0.38163387,0.2858231707,0.4309209739,0.2411730658,0.2911490683,0.2434808015,0.2427302296,0.1461917061,-5.633136095,-8.470744997,1.6219439475,0.5240091463,-10.96454478,-5.161103608,-7.909549689,0.8278347252,4.4662362251,-12.9136007,-2.556213018,-6.995502891,2.0035778175,0.8098323171,-10.53362381,-4.919930542,-7.618400621,1.0713155268,4.7089664547,-12.767409 +050,2,4,29,219,Missouri,Warren County,32513,32546,32612,32615,32746,32987,33185,33539,33875,34462,34801,35716,36594,66,3,131,241,198,354,336,587,339,915,878,104,414,391,421,386,420,421,435,403,435,441,42,257,266,240,307,295,302,300,324,325,332,62,157,125,181,79,125,119,135,79,110,109,-2,-4,-12,-4,6,19,8,15,12,13,11,10,-150,24,69,118,210,209,436,248,793,764,8,-154,12,65,124,229,217,451,260,806,775,-4,0,-6,-5,-5,0,0,1,0,-1,-6,317,317,317,317,317,317,317,317,317,317,317,317,12.694129732,11.964321231,12.809395585,11.666565919,12.589173311,12.489987243,12.731024189,11.636804643,12.337450544,12.197483059,7.8801723213,8.1394103517,7.3022682671,9.27884906,8.8423955398,8.9595632955,8.780016682,9.3556444278,9.2176354638,9.182685659,4.8139574103,3.8249108796,5.5071273181,2.3877168591,3.7467777711,3.5304239475,3.9510075069,2.2811602154,3.1198150801,3.0147974001,-0.122648596,-0.367191444,-0.121704471,0.1813455842,0.5695102212,0.237339425,0.4390008341,0.3465053492,0.3687054186,0.3042456092,-4.599322367,0.7343828889,2.0994021268,3.5664631566,6.2945866555,6.2004924793,12.760290911,7.1611105496,22.491030532,21.131240492,-4.721970963,0.3671914444,1.9776976557,3.7478087409,6.8640968767,6.4378319044,13.199291745,7.5076158988,22.85973595,21.435486102 +050,2,4,29,221,Missouri,Washington County,25195,25200,25198,25106,25088,25145,25078,24795,24847,25000,24900,24743,24604,-2,-92,-18,57,-67,-283,52,153,-100,-157,-139,74,306,306,303,291,296,292,294,277,277,269,59,237,248,252,295,291,299,318,310,259,313,15,69,58,51,-4,5,-7,-24,-33,18,-44,0,2,0,0,0,0,0,0,0,0,0,-15,-165,-70,10,-58,-290,60,177,-65,-175,-97,-15,-163,-70,10,-58,-290,60,177,-65,-175,-97,-2,2,-6,-4,-5,2,-1,0,-2,0,2,1091,1091,1091,1091,1091,1091,1092,1082,1085,1092,1119,1047,12.166030534,12.192692354,12.063782772,11.58831611,11.870150181,11.7642319,11.796096054,11.102204409,11.159680116,10.90238515,9.4227099237,9.8816591624,10.033245078,11.747605679,11.669640888,12.046251158,12.759042671,12.424849699,10.434502347,12.685674914,2.7433206107,2.3110331912,2.0305376943,-0.159289569,0.2005092936,-0.282019258,-0.962946617,-1.322645291,0.7251777693,-1.783289764,0.0795165394,0,0,0,0,0,0,0,0,0,-6.560114504,-2.789177989,0.3981446459,-2.309698744,-11.62953903,2.4173079247,7.1017312978,-2.605210421,-7.050339423,-3.931343344,-6.480597964,-2.789177989,0.3981446459,-2.309698744,-11.62953903,2.4173079247,7.1017312978,-2.605210421,-7.050339423,-3.931343344 +050,2,4,29,223,Missouri,Wayne County,13521,13535,13519,13424,13409,13476,13482,13435,13229,13309,13079,12904,12769,-16,-95,-15,67,6,-47,-206,80,-230,-175,-135,34,145,129,177,129,146,133,144,135,127,123,58,198,191,191,202,199,182,206,216,161,190,-24,-53,-62,-14,-73,-53,-49,-62,-81,-34,-67,0,0,-1,0,4,-1,-1,-1,-1,-1,-1,9,-42,48,80,77,8,-156,144,-147,-139,-68,9,-42,47,80,81,7,-157,143,-148,-140,-69,-1,0,0,1,-2,-1,0,-1,-1,-1,1,133,133,133,133,133,133,133,133,133,133,133,133,10.763463608,9.6150262736,13.167193602,9.5704429112,10.848162871,9.9759975998,10.85236265,10.231923602,9.7756225224,9.5820511822,14.697695134,14.236201692,14.208666543,14.986274946,14.786194598,13.651365137,15.52490768,16.371077763,12.392718316,14.801542477,-3.934231526,-4.621175418,-1.04147294,-5.415832035,-3.938031727,-3.675367537,-4.67254503,-6.139154161,-2.617095793,-5.219491294,0,-0.074535087,0,0.2967579197,-0.074302485,-0.075007501,-0.07536363,-0.075792027,-0.076973406,-0.077902855,-3.117692907,3.5776841948,5.9512739446,5.7125899547,0.5944198833,-11.70117012,10.85236265,-11.14142792,-10.69930339,-5.297394149,-3.117692907,3.5031491074,5.9512739446,6.0093478745,0.5201173979,-11.77617762,10.77699902,-11.21721995,-10.7762768,-5.375297005 +050,2,4,29,225,Missouri,Webster County,36202,36264,36320,36451,36451,36630,37044,37611,38158,38767,39205,39644,39859,56,131,0,179,414,567,547,609,438,439,215,130,470,522,498,552,568,572,577,591,606,616,101,278,288,333,284,346,330,353,378,367,410,29,192,234,165,268,222,242,224,213,239,206,1,-3,-3,-2,1,3,4,14,10,13,11,30,-56,-238,21,156,341,303,372,216,185,-2,31,-59,-241,19,157,344,307,386,226,198,9,-4,-2,7,-5,-11,1,-2,-1,-1,2,0,879,879,879,879,926,882,915,956,958,926,920,729,12.917233513,14.320594771,13.628713345,14.984933627,15.216663318,15.098523143,15.001624959,15.15928795,15.371152456,15.496270581,7.6404062058,7.9010178047,9.1131757912,7.7096397644,9.2693054718,8.7106864285,9.1777705557,9.6957882317,9.3089322629,10.314076198,5.2768273076,6.4195769663,4.5155375542,7.2752938621,5.9473578461,6.3878367142,5.8238544036,5.4634997178,6.062220193,5.1821943826,-0.082450427,-0.082302269,-0.054733789,0.0271466189,0.0803697006,0.1055840779,0.3639909002,0.2565023342,0.3297441946,0.2767191175,-1.539074631,-6.529313325,0.5747047796,4.2348725466,9.1353559708,7.9979939025,9.671758206,5.5404504181,4.6925135385,-0.050312567,-1.621525058,-6.611615594,0.5199709911,4.2620191655,9.2157256714,8.1035779804,10.035749106,5.7969527523,5.0222577331,0.2264065507 +050,2,4,29,227,Missouri,Worth County,2171,2169,2152,2118,2080,2079,2054,2042,2009,2041,2011,1989,1953,-17,-34,-38,-1,-25,-12,-33,32,-30,-22,-36,5,21,28,25,20,27,16,25,23,24,21,10,42,25,30,28,33,39,26,32,21,23,-5,-21,3,-5,-8,-6,-23,-1,-9,3,-2,0,0,0,0,0,0,0,0,0,0,0,-14,-13,-41,4,-16,-6,-10,33,-21,-25,-34,-14,-13,-41,4,-16,-6,-10,33,-21,-25,-34,2,0,0,0,-1,0,0,0,0,0,0,52,52,52,52,52,52,52,52,52,52,52,52,9.8360655738,13.339685565,12.022120702,9.6781998548,13.18359375,7.8992841274,12.345679012,11.352418559,12,10.654490107,19.672131148,11.91043354,14.426544843,13.549479797,16.11328125,19.25450506,12.839506173,15.794669299,10.5,11.66920345,-9.836065574,1.4292520248,-2.40442414,-3.871279942,-2.9296875,-11.35522093,-0.49382716,-4.44225074,1.5,-1.014713343,0,0,0,0,0,0,0,0,0,0,-6.088992974,-19.53311101,1.9235393123,-7.742559884,-2.9296875,-4.93705258,16.296296296,-10.36525173,-12.5,-17.25012684,-6.088992974,-19.53311101,1.9235393123,-7.742559884,-2.9296875,-4.93705258,16.296296296,-10.36525173,-12.5,-17.25012684 +050,2,4,29,229,Missouri,Wright County,18815,18740,18777,18569,18557,18335,18200,18147,18181,18216,18230,18329,18325,37,-208,-12,-222,-135,-53,34,35,14,99,-4,54,226,249,238,235,253,240,267,251,240,243,53,233,215,223,225,233,223,273,271,257,243,1,-7,34,15,10,20,17,-6,-20,-17,0,3,-2,-1,-1,-3,-5,-3,-4,-4,-4,-2,32,-199,-42,-239,-142,-67,21,47,38,121,-1,35,-201,-43,-240,-145,-72,18,43,34,117,-3,1,0,-3,3,0,-1,-1,-2,0,-1,-1,195,195,195,195,195,195,195,195,195,195,195,195,12.10303647,13.4137801,12.902526293,12.864376625,13.921369026,13.21294869,14.671538863,13.773802338,13.129461966,13.25912588,12.477909281,11.582179605,12.089341863,12.316956343,12.820865546,12.277031491,15.001236366,14.871316468,14.059465521,13.25912588,-0.374872811,1.8316004956,0.8131844302,0.5474202819,1.1005034803,0.9359171989,-0.329697503,-1.09751413,-0.930003556,0,-0.107106517,-0.053870603,-0.054212295,-0.164226085,-0.27512587,-0.165161859,-0.219798335,-0.219502826,-0.218824366,-0.109128608,-10.65709848,-2.262565318,-12.95673859,-7.773368003,-3.686686659,1.1561330104,2.5826304366,2.0852768479,6.6194370743,-0.054564304,-10.764205,-2.316435921,-13.01095088,-7.937594088,-3.961812529,0.9909711517,2.3628321015,1.8657740218,6.4006127082,-0.163692912 +050,2,4,29,510,Missouri,St. Louis city,319294,319308,319367,319417,319534,318624,317599,316268,312926,308424,303661,300887,297645,59,50,117,-910,-1025,-1331,-3342,-4502,-4763,-2774,-3242,1241,4821,4886,4634,4796,4575,4501,4170,4183,4049,3970,682,3081,2901,3008,2941,3009,2972,3117,3026,3033,3348,559,1740,1985,1626,1855,1566,1529,1053,1157,1016,622,308,1260,814,708,679,1085,694,956,741,763,593,-797,-2957,-2661,-3220,-3555,-3975,-5571,-6509,-6653,-4528,-4439,-489,-1697,-1847,-2512,-2876,-2890,-4877,-5553,-5912,-3765,-3846,-11,7,-21,-24,-4,-7,6,-2,-8,-25,-18,11978,11968,11981,12005,12014,12035,11981,11860,11627,11663,11682,11656,15.094304178,15.293817523,14.523049151,15.076474758,14.435204862,14.307193012,13.422386739,13.668036302,13.395131569,13.2657903,9.6464532612,9.080508521,9.4271324656,9.2451860433,9.4941052303,9.4470068055,10.032992677,9.8875156228,10.033942714,11.18737177,5.4478509167,6.2133090018,5.0959166852,5.8312887148,4.9410996313,4.8601862065,3.3893940613,3.7805206793,3.3611888551,2.0784185307,3.9449954914,2.5479262103,2.2188862319,2.1344717182,3.4234310983,2.2059968785,3.0771706768,2.4212323452,2.5241998981,1.9815147728,-9.25821561,-8.329277206,-10.09154473,-11.17532689,-12.54206324,-17.70836976,-20.95115474,-21.73881079,-14.97978655,-14.83295797,-5.313220118,-5.781350996,-7.872658495,-9.040855172,-9.118632142,-15.50237288,-17.87398407,-19.31757844,-12.45558665,-12.8514432 +040,4,8,30,000,Montana,Montana,989415,989400,990730,997518,1004168,1014158,1022657,1031495,1042137,1053862,1061818,1070123,1080577,1330,6788,6650,9990,8499,8838,10642,11725,7956,8305,10454,3068,11985,12016,12198,12378,12581,12499,12116,11663,11305,11314,2411,9111,8963,9443,9372,9679,9922,10258,9900,9923,10756,657,2874,3053,2755,3006,2902,2577,1858,1763,1382,558,385,617,535,1862,817,798,1026,1106,435,1277,990,299,3297,3015,5320,4612,5088,7009,8712,5744,5660,8960,684,3914,3550,7182,5429,5886,8035,9818,6179,6937,9950,-11,0,47,53,64,50,30,49,14,-14,-54,28849,28846,28787,28792,28848,28854,28829,28874,28814,28941,28898,28900,12.055840117,12.005879044,12.087244578,12.15427027,12.249336953,12.055176618,11.561074218,11.025296831,10.605359154,10.521225647,9.1648526743,8.9554505552,9.3572594318,9.2026030837,9.4238401053,9.5696825666,9.7881726089,9.3586931861,9.3088880039,10.002324824,2.8909874422,3.0504284888,2.7299851461,2.9516671863,2.8254968474,2.485494051,1.7729016092,1.6666036452,1.29647115,0.518900823,0.6206469213,0.5345493749,1.8450934091,0.8022328979,0.7769629511,0.9895680622,1.055344015,0.4112153067,1.1979693622,0.9206304924,3.3164876816,3.0124604958,5.2716954545,4.5286390762,4.9538690418,6.7601194426,8.3129810654,5.429932693,5.309715419,8.3321709211,3.9371346029,3.5470098707,7.1167888636,5.3308719741,5.730831993,7.7496875048,9.3683250803,5.8411479997,6.5076847811,9.2528014135 +050,4,8,30,001,Montana,Beaverhead County,9246,9246,9257,9214,9361,9307,9340,9303,9462,9436,9413,9474,9483,11,-43,147,-54,33,-37,159,-26,-23,61,9,20,95,91,87,99,87,82,80,84,85,80,9,78,70,75,91,98,82,110,81,89,105,11,17,21,12,8,-11,0,-30,3,-4,-25,2,10,1,2,6,14,17,26,6,10,10,-1,-70,121,-69,21,-40,142,-21,-32,54,25,1,-60,122,-67,27,-26,159,5,-26,64,35,-1,0,4,1,-2,0,0,-1,0,1,-1,444,444,444,444,443,443,443,443,442,442,442,442,10.286394889,9.798115747,9.3207628027,10.618330026,9.3332618141,8.7396749267,8.466504392,8.9129396785,9.00090009,8.4401540328,8.4456715933,7.5370121131,8.0351403471,9.7602831555,10.5133294,8.7396749267,11.641443539,8.5946204043,9.424471859,11.077702168,1.840723296,2.2611036339,1.2856224555,0.8580468708,-1.180067586,0,-3.174939147,0.3183192742,-0.423571769,-2.637548135,1.0827784094,0.1076716016,0.2142704093,0.6435351531,1.5019042,1.8118838263,2.7516139274,0.6366385485,1.0589294224,1.0550192541,-7.579448866,13.028263795,-7.392329119,2.2523730359,-4.291154857,15.134559019,-2.222457403,-3.395405592,5.7182188807,2.6375481353,-6.496670456,13.135935397,-7.17805871,2.895908189,-2.789250657,16.946442846,0.5291565245,-2.758767043,6.7771483031,3.6925673894 +050,4,8,30,003,Montana,Big Horn County,12865,12863,12912,13058,12996,13114,13341,13310,13438,13454,13305,13248,13063,49,146,-62,118,227,-31,128,16,-149,-57,-185,71,251,268,254,315,292,255,269,218,222,211,26,102,121,134,112,130,142,131,138,132,143,45,149,147,120,203,162,113,138,80,90,68,1,1,0,-2,16,22,10,7,4,10,7,4,-4,-212,2,9,-216,6,-130,-232,-157,-259,5,-3,-212,0,25,-194,16,-123,-228,-147,-252,-1,0,3,-2,-1,1,-1,1,-1,0,-1,137,137,137,137,137,137,137,137,137,136,136,137,19.329996149,20.57265679,19.45614707,23.814023814,21.912873813,19.066846119,20.005949725,16.293583467,16.721274432,16.038919083,7.8552175587,9.2884010133,10.264266565,8.4672084672,9.7557314923,10.61761627,9.7426744013,10.314286782,9.9423793922,10.869978336,11.474778591,11.284255776,9.1918805056,15.346815347,12.157142321,8.449229849,10.263275324,5.9792966852,6.7788950401,5.1689407472,0.0770119369,0,-0.153198008,1.2096012096,1.6509699448,0.7477194557,0.5206009222,0.2989648343,0.75321056,0.5320968416,-0.308047747,-16.27389268,0.1531980084,0.6804006804,-16.20952309,0.4486316734,-9.668302841,-17.33996039,-11.82540579,-19.68758314,-0.231035811,-16.27389268,0,1.89000189,-14.55855315,1.1963511291,-9.147701919,-17.04099555,-11.07219523,-19.1554863 +050,4,8,30,005,Montana,Blaine County,6491,6492,6503,6576,6683,6638,6710,6683,6716,6740,6764,6704,6568,11,73,107,-45,72,-27,33,24,24,-60,-136,21,112,117,100,110,122,118,107,95,101,104,6,70,79,58,66,80,67,74,70,51,69,15,42,38,42,44,42,51,33,25,50,35,0,1,27,19,22,11,6,1,1,2,1,-3,30,41,-108,7,-81,-23,-10,-2,-112,-171,-3,31,68,-89,29,-70,-17,-9,-1,-110,-170,-1,0,1,2,-1,1,-1,0,0,0,-1,220,220,220,220,220,220,220,220,220,220,220,220,17.126691643,17.648389773,15.013887846,16.481869943,18.218472336,17.613254721,15.903686088,14.069905213,14.998514999,15.672091621,10.704182277,11.91643412,8.7080549508,9.8891219658,11.946539237,10.000746324,10.998810939,10.367298578,7.5735075735,10.397830018,6.4225093662,5.7319556528,6.3058328954,6.5927479772,6.2719330994,7.6125083961,4.9048751486,3.7026066351,7.425007425,5.2742616034,0.1529168897,4.0727053322,2.8526386908,3.2963739886,1.6426491451,0.8955892231,0.1486325803,0.1481042654,0.297000297,0.1506931887,4.5875066901,6.1844784675,-16.21499887,1.0488462691,-12.09587098,-3.433092022,-1.486325803,-0.296208531,-16.63201663,-25.76853526,4.7404235798,10.2571838,-13.36236018,4.3452202577,-10.45322183,-2.537502799,-1.337693222,-0.148104265,-16.33501634,-25.61784207 +050,4,8,30,007,Montana,Broadwater County,5612,5608,5632,5725,5759,5678,5657,5717,5787,5922,6043,6203,6444,24,93,34,-81,-21,60,70,135,121,160,241,12,51,51,56,49,42,51,53,54,66,61,6,54,55,65,50,47,59,71,64,44,61,6,-3,-4,-9,-1,-5,-8,-18,-10,22,0,0,-4,-3,1,1,1,0,0,0,0,0,16,99,41,-74,-21,64,79,153,131,137,243,16,95,38,-73,-20,65,79,153,131,137,243,2,1,0,1,0,0,-1,0,0,1,-2,52,52,52,52,52,52,52,52,52,52,52,52,8.9812450471,8.881922675,9.7927778264,8.6457873842,7.3852646386,8.8664812239,9.0528653173,9.0263267865,10.779029887,9.6465564956,9.5095535793,9.5785440613,11.36661712,8.8222320247,8.2644628099,10.257301808,12.12742335,10.697868784,7.1860199249,9.6465564956,-0.528308532,-0.696621386,-1.573839294,-0.17644464,-0.879198171,-1.390820584,-3.074558032,-1.671541997,3.5930099624,0,-0.704411376,-0.52246604,0.1748710326,0.1764446405,0.1758396343,0,0,0,0,0,17.434181562,7.1403692093,-12.94045641,-3.70533745,11.253736592,13.734353268,26.133743274,21.897200167,22.374652948,38.428085712,16.729770186,6.6179031696,-12.76558538,-3.52889281,11.429576226,13.734353268,26.133743274,21.897200167,22.374652948,38.428085712 +050,4,8,30,009,Montana,Carbon County,10078,10078,10063,10089,10142,10338,10438,10404,10480,10687,10654,10703,10921,-15,26,53,196,100,-34,76,207,-33,49,218,23,96,82,66,81,59,64,81,83,87,84,42,93,100,86,88,96,123,91,119,87,93,-19,3,-18,-20,-7,-37,-59,-10,-36,0,-9,1,-4,12,8,5,2,2,6,4,8,7,4,27,58,204,99,2,134,212,-1,41,223,5,23,70,212,104,4,136,218,3,49,230,-1,0,1,4,3,-1,-1,-1,0,0,-3,53,53,53,53,53,53,53,53,53,53,53,53,9.5275903136,8.1063714102,6.4453125,7.7974586061,5.6616447558,6.1290940433,7.6534227807,7.7784546179,8.147211687,7.769145394,9.2298531163,9.8858187929,8.3984375,8.4713130535,9.2121677382,11.779352614,8.5982897907,11.152242163,8.147211687,8.6015538291,0.2977371973,-1.779447383,-1.953125,-0.673854447,-3.550522982,-5.650258571,-0.94486701,-3.373787545,0,-0.832408435,-0.39698293,1.1862982552,0.78125,0.4813246053,0.1919201612,0.1915341889,0.566920206,0.3748652828,0.7491688908,0.6474287828,2.6796347757,5.7337748999,19.921875,9.5302271852,0.1919201612,12.832790653,20.031180611,-0.093716321,3.8394905652,20.625231225,2.282651846,6.9200731551,20.703125,10.011551791,0.3838403224,13.024324842,20.598100817,0.2811489621,4.5886594559,21.272660007 +050,4,8,30,011,Montana,Carter County,1160,1160,1159,1136,1157,1152,1150,1147,1175,1222,1223,1245,1235,-1,-23,21,-5,-2,-3,28,47,1,22,-10,3,10,10,11,16,19,13,21,17,20,20,0,15,20,8,16,10,11,20,21,12,15,3,-5,-10,3,0,9,2,1,-4,8,5,0,0,0,0,0,0,0,0,0,0,0,-4,-19,31,-8,-2,-13,26,45,7,14,-16,-4,-19,31,-8,-2,-13,26,45,7,14,-16,0,1,0,0,0,1,0,1,-2,0,1,11,11,11,11,11,11,11,11,11,11,11,11,8.7145969499,8.7221979939,9.5279341706,13.900955691,16.54331737,11.197243755,17.521902378,13.90593047,16.207455429,16.129032258,13.071895425,17.444395988,6.9294066696,13.900955691,8.7070091424,9.4745908699,16.687526074,17.17791411,9.7244732577,12.096774194,-4.357298475,-8.722197994,2.5985275011,0,7.8363082281,1.7226528854,0.8343763037,-3.27198364,6.4829821718,4.0322580645,0,0,0,0,0,0,0,0,0,0,-16.5577342,27.038813781,-6.92940667,-1.737619461,-11.31911189,22.394487511,37.546933667,5.7259713701,11.345218801,-12.90322581,-16.5577342,27.038813781,-6.92940667,-1.737619461,-11.31911189,22.394487511,37.546933667,5.7259713701,11.345218801,-12.90322581 +050,4,8,30,013,Montana,Cascade County,81327,81327,81513,81734,81657,82241,82118,81959,81655,81729,81756,81393,81346,186,221,-77,584,-123,-159,-304,74,27,-363,-47,312,1193,1177,1180,1150,1200,1123,1089,1070,1033,1028,230,818,790,794,800,827,903,933,882,839,848,82,375,387,386,350,373,220,156,188,194,180,66,48,238,171,89,118,106,44,-28,50,38,40,-197,-705,36,-558,-649,-629,-120,-129,-607,-266,106,-149,-467,207,-469,-531,-523,-76,-157,-557,-228,-2,-5,3,-9,-4,-1,-1,-6,-4,0,1,2562,2559,2475,2462,2527,2516,2469,2474,2470,2488,2445,2447,14.615888807,14.407158289,14.399199502,13.993757567,14.627278656,13.727431638,13.330558684,13.089885922,12.663270998,12.633726396,10.021623675,9.6700552662,9.6889528853,9.7347878729,10.080632874,11.038175217,11.420946972,10.789980732,10.285076832,10.421595315,4.594265132,4.7371030228,4.7102466168,4.2589696944,4.5466457822,2.6892564206,1.9096117123,2.2999051901,2.3781941661,2.2121310811,0.5880659369,2.9132571561,2.0866636567,1.0829951509,1.4383490678,1.295732639,0.5386084317,-0.342539071,0.6129366407,0.4670054504,-2.413520616,-8.629606282,0.4392976119,-6.790014541,-7.910919873,-7.688828584,-1.468932086,-1.578126434,-7.441050819,-3.269038153,-1.825454679,-5.716349126,2.5259612686,-5.70701939,-6.472570805,-6.393095945,-0.930323655,-1.920665504,-6.828114178,-2.802032703 +050,4,8,30,015,Montana,Chouteau County,5813,5813,5810,5812,5933,5854,5902,5777,5780,5738,5759,5681,5699,-3,2,121,-79,48,-125,3,-42,21,-78,18,17,45,35,50,42,55,58,52,66,46,51,24,40,55,64,69,67,57,75,52,52,69,-7,5,-20,-14,-27,-12,1,-23,14,-6,-18,2,8,4,8,6,2,1,15,0,1,0,2,-11,134,-74,71,-115,1,-35,9,-74,36,4,-3,138,-66,77,-113,2,-20,9,-73,36,0,0,3,1,-2,0,0,1,-2,1,0,135,135,135,135,135,135,135,135,135,135,135,135,7.7439339184,5.9599829715,8.483922966,7.1452875128,9.4186146074,10.037206888,9.0293453725,11.48125598,8.041958042,8.9630931459,6.8834968164,9.3656875266,10.859421396,11.738686628,11.473585067,9.8641515964,13.023094287,9.0458380447,9.0909090909,12.126537786,0.860437102,-3.405704555,-2.37549843,-4.593399115,-2.05497046,0.1730552912,-3.993748915,2.4354179351,-1.048951049,-3.16344464,1.3766993633,0.681140911,1.3574276746,1.020755359,0.3424950766,0.1730552912,2.6046188574,0,0.1748251748,0,-1.892961625,22.818220519,-12.55620599,12.078938414,-19.69346691,0.1730552912,-6.077444001,1.5656258154,-12.93706294,6.3268892794,-0.516262261,23.49936143,-11.19877832,13.099693773,-19.35097183,0.3461105823,-3.472825143,1.5656258154,-12.76223776,6.3268892794 +050,4,8,30,017,Montana,Custer County,11699,11699,11691,11759,11804,11883,12023,12098,11844,11741,11576,11361,11292,-8,68,45,79,140,75,-254,-103,-165,-215,-69,33,152,137,178,153,165,146,148,119,117,109,42,141,136,161,122,136,145,141,143,133,157,-9,11,1,17,31,29,1,7,-24,-16,-48,2,4,1,8,1,3,3,2,0,4,5,0,54,44,55,108,44,-259,-112,-143,-202,-26,2,58,45,63,109,47,-256,-110,-143,-198,-21,-1,-1,-1,-1,0,-1,1,0,2,-1,0,413,413,416,412,413,413,413,412,412,429,429,429,12.963752665,11.628400458,15.029340989,12.800133858,13.681024833,12.196140673,12.550349799,10.207145002,10.201857261,9.6234494327,12.025586354,11.543521623,13.59395449,10.206642684,11.276481075,12.112605463,11.956752173,12.265728867,11.596983041,13.861298724,0.9381663113,0.0848788355,1.4353864989,2.5934911738,2.4045437586,0.0835352101,0.5935976256,-2.058583866,-1.395125779,-4.237849291,0.3411513859,0.0848788355,0.6754759995,0.0836610056,0.2487459061,0.2506056303,0.1695993216,0,0.3487814448,0.4414426345,4.60554371,3.7346687603,4.6438974965,9.0353886054,3.6482732888,-21.63561941,-9.49756201,-12.26572887,-17.61346296,-2.2955017,4.9466950959,3.8195475958,5.319373496,9.119049611,3.8970191949,-21.38501378,-9.327962688,-12.26572887,-17.26468152,-1.854059065 +050,4,8,30,019,Montana,Daniels County,1751,1751,1749,1760,1775,1778,1798,1751,1730,1720,1706,1646,1638,-2,11,15,3,20,-47,-21,-10,-14,-60,-8,6,17,17,20,24,21,15,11,20,15,15,12,31,13,19,32,29,21,20,27,15,19,-6,-14,4,1,-8,-8,-6,-9,-7,0,-4,0,1,1,4,5,3,0,0,0,0,0,4,24,9,-1,23,-41,-16,-1,-8,-59,-5,4,25,10,3,28,-38,-16,-1,-8,-59,-5,0,0,1,-1,0,-1,1,0,1,-1,1,41,41,41,41,41,41,41,41,41,41,41,41,9.6893701909,9.6181046676,11.258091753,13.422818792,11.834319527,8.6182131571,6.3768115942,11.675423234,8.9498806683,9.1352009744,17.668851525,7.3550212164,10.695187166,17.897091723,16.342631727,12.06549842,11.594202899,15.761821366,8.9498806683,11.571254568,-7.979481334,2.2630834512,0.5629045877,-4.474272931,-4.508312201,-3.447285263,-5.217391304,-4.086398132,0,-2.436053593,0.5699629524,0.5657708628,2.2516183507,2.7964205817,1.6906170752,0,0,0,0,0,13.679110858,5.0919377652,-0.562904588,12.863534676,-23.10510003,-9.192760701,-0.579710145,-4.670169294,-35.20286396,-3.045066991,14.24907381,5.657708628,1.688713763,15.659955257,-21.41448295,-9.192760701,-0.579710145,-4.670169294,-35.20286396,-3.045066991 +050,4,8,30,021,Montana,Dawson County,8966,8964,8952,9030,9238,9392,9518,9591,9279,8966,8683,8638,8555,-12,78,208,154,126,73,-312,-313,-283,-45,-83,33,128,96,108,127,132,121,103,70,95,91,19,114,104,111,92,94,97,101,92,77,92,14,14,-8,-3,35,38,24,2,-22,18,-1,0,-1,-3,4,-4,-1,1,0,0,2,2,-27,64,212,147,93,35,-338,-317,-262,-64,-84,-27,63,209,151,89,34,-337,-317,-262,-62,-82,1,1,7,6,2,1,1,2,1,-1,0,498,498,498,498,498,498,498,498,498,498,498,498,14.236458681,10.510181739,11.594202899,13.432046536,13.815479617,12.824589295,11.290764593,7.9324607626,10.969343571,10.585703484,12.679346013,11.386030217,11.91626409,9.7303014278,9.8382960908,10.280869104,11.071526446,10.425519859,8.8909416315,10.702029896,1.5571126682,-0.875848478,-0.322061192,3.7017451084,3.9771835261,2.5437201908,0.2192381474,-2.493059097,2.0784019398,-0.116326412,-0.111222333,-0.328443179,0.4294149222,-0.423056584,-0.104662724,0.1059883413,0,0,0.2309335489,0.2326528238,7.1182293405,23.209984673,15.78099839,9.8360655738,3.663195353,-35.82405935,-34.74924637,-29.69006743,-7.389873564,-9.771418601,7.007007007,22.881541493,16.210413312,9.41300899,3.5585326286,-35.71807101,-34.74924637,-29.69006743,-7.158940015,-9.538765777 +050,4,8,30,023,Montana,Deer Lodge County,9298,9294,9291,9282,9220,9264,9125,9115,9071,9122,9159,9207,9204,-3,-9,-62,44,-139,-10,-44,51,37,48,-3,25,70,69,62,67,83,76,85,63,73,73,40,127,134,119,117,132,129,131,124,106,129,-15,-57,-65,-57,-50,-49,-53,-46,-61,-33,-56,0,-1,-2,1,-2,-1,4,11,-2,0,0,13,49,7,99,-87,41,5,87,99,81,55,13,48,5,100,-89,40,9,98,97,81,55,-1,0,-2,1,0,-1,0,-1,1,0,-2,811,811,837,841,851,844,843,837,835,851,852,852,7.5378237226,7.4586531186,6.7085046527,7.2869650334,9.100877193,8.3580776421,9.3442532842,6.8924019474,7.9494718502,7.9300418228,13.675765897,14.484920549,12.876000866,12.72499864,14.473684211,14.18673705,14.401143297,13.565997484,11.543068714,14.013361577,-6.137942174,-7.026267431,-6.167496213,-5.438033607,-5.372807018,-5.828659408,-5.056890013,-6.673595536,-3.593596864,-6.083319754,-0.107683196,-0.216192844,0.1082016879,-0.217521344,-0.109649123,0.4398988233,1.2092563074,-0.218806411,0,0,5.2764766058,0.7566749541,10.711967107,-9.462178476,4.4956140351,0.5498735291,9.5641180674,10.830917346,8.8206468474,5.9746890446,5.1687934098,0.54048211,10.820168795,-9.679699821,4.3859649123,0.9897723524,10.773374375,10.612110935,8.8206468474,5.9746890446 +050,4,8,30,025,Montana,Fallon County,2890,2890,2889,2930,3025,3047,3111,3172,3097,3012,2925,2878,2826,-1,41,95,22,64,61,-75,-85,-87,-47,-52,6,58,50,41,58,52,52,38,33,32,29,2,36,27,39,27,29,35,31,33,24,29,4,22,23,2,31,23,17,7,0,8,0,0,0,0,-1,0,0,5,2,1,3,2,-6,18,70,21,34,38,-96,-96,-88,-58,-53,-6,18,70,20,34,38,-91,-94,-87,-55,-51,1,1,2,0,-1,0,-1,2,0,0,-1,34,34,34,34,34,34,34,34,34,34,34,34,19.934696683,16.792611251,13.504611331,18.837284833,16.55260226,16.589567714,12.440661319,11.116725619,11.028778218,10.168302945,12.37326001,9.0680100756,12.845849802,8.7690808704,9.2312589527,11.166055192,10.14896055,11.116725619,8.2715836636,10.168302945,7.561436673,7.7246011755,0.6587615283,10.068203962,7.3213433073,5.4235125219,2.2917007694,0,2.7571945545,0,0,0,-0.329380764,0,0,1.5951507417,0.6547716484,0.3368704733,1.033947958,0.7012622721,6.1866300052,23.509655751,6.9169960474,11.042546281,12.096132421,-30.62689424,-31.42903912,-29.64460165,-19.98966052,-18.58345021,6.1866300052,23.509655751,6.5876152833,11.042546281,12.096132421,-29.0317435,-30.77426747,-29.30773118,-18.95571256,-17.88218794 +050,4,8,30,027,Montana,Fergus County,11586,11590,11585,11463,11394,11470,11336,11315,11333,11280,11088,11032,11104,-5,-122,-69,76,-134,-21,18,-53,-192,-56,72,40,113,105,128,106,149,110,121,122,109,109,52,156,172,149,170,150,153,180,144,131,143,-12,-43,-67,-21,-64,-1,-43,-59,-22,-22,-34,2,5,1,9,5,4,12,9,7,16,11,7,-82,-2,87,-74,-24,49,-1,-177,-49,97,9,-77,-1,96,-69,-20,61,8,-170,-33,108,-2,-2,-1,1,-1,0,0,-2,0,-1,-2,465,465,465,465,465,465,465,465,465,465,465,465,9.8056230476,9.1875574222,11.196641008,9.295799351,13.156152046,9.7138820205,10.701808694,10.908440629,9.8553345389,9.8482110589,13.536966331,15.050094063,13.033589923,14.90835745,13.244448369,13.51112681,15.920045991,12.875536481,11.844484629,12.920130105,-3.731343284,-5.862536641,-1.836948915,-5.612558099,-0.088296322,-3.79724479,-5.218237297,-1.967095851,-1.98915009,-3.071919046,0.433877126,0.0875005469,0.7872638209,0.4384811015,0.3531852898,1.0596962204,0.7960022996,0.6258941345,1.4466546112,0.9938561619,-7.115584866,-0.175001094,7.6102169349,-6.489520302,-2.119111739,4.3270929,-0.0884447,-15.82618026,-4.430379747,8.7640043368,-6.68170774,-0.087500547,8.3974807558,-6.0510392,-1.765926449,5.3867891205,0.7075575996,-15.20028612,-2.983725136,9.7578604987 +050,4,8,30,029,Montana,Flathead County,90928,90922,90863,91282,91630,92988,94642,95940,97901,100272,102100,103880,105851,-59,419,348,1358,1654,1298,1961,2371,1828,1780,1971,265,1100,1066,1100,1131,1108,1172,1139,1109,1119,1114,189,746,787,820,812,938,915,893,929,934,1004,76,354,279,280,319,170,257,246,180,185,110,30,60,-2,74,-5,1,17,118,-7,44,29,-170,9,90,995,1314,1119,1682,1998,1649,1554,1842,-140,69,88,1069,1309,1120,1699,2116,1642,1598,1871,5,-4,-19,9,26,8,5,9,6,-3,-10,992,992,992,992,992,992,992,992,992,992,992,992,12.078289275,11.655878237,11.91649785,12.055641422,11.627540901,12.092384996,11.495006888,10.960014231,10.865132537,10.623131535,8.1912761811,8.6052309307,8.8832074879,8.6553323029,9.843531918,9.4407271939,9.0123276127,9.1811120115,9.0688416351,9.5741688162,3.887013094,3.0506473058,3.0332903617,3.400309119,1.784008983,2.651657802,2.4826792752,1.7789022197,1.796290902,1.0489627189,0.6588157786,-0.021868439,0.8016553099,-0.053296381,0.0104941705,0.1754014888,1.1908786767,-0.069179531,0.4272259443,0.2765447168,0.0988223668,0.9840797761,10.779013964,14.006288973,11.742976776,17.354429661,20.164199967,16.29672089,15.088843577,17.565357529,0.7576381454,0.9622113366,11.580669274,13.952992592,11.753470947,17.52983115,21.355078643,16.227541359,15.516069521,17.841902246 +050,4,8,30,031,Montana,Gallatin County,89513,89515,89662,91413,92627,94885,97629,101043,104999,108850,111878,114472,116806,147,1751,1214,2258,2744,3414,3956,3851,3028,2594,2334,289,1040,1101,1120,1205,1121,1305,1170,1242,1082,1130,148,517,496,537,493,530,532,597,548,605,681,141,523,605,583,712,591,773,573,694,477,449,77,112,60,393,201,164,229,265,118,291,223,-67,1108,539,1252,1764,2611,2929,2983,2199,1819,1664,10,1220,599,1645,1965,2775,3158,3248,2317,2110,1887,-4,8,10,30,67,48,25,30,17,7,-2,3260,3261,3260,3259,3263,3266,3266,3269,3271,3273,3274,3273,11.48695292,11.964790263,11.945902129,12.518570078,11.284931948,12.667320255,10.942300408,11.253669675,9.5604152861,9.7717897941,5.7103410189,5.3901325799,5.7276334315,5.1217054344,5.3354272369,5.1639956902,5.5833789263,4.965387264,5.3457035564,5.8890166812,5.7766119011,6.5746576831,6.2182686975,7.3968646436,5.9495047113,7.5033245649,5.358921482,6.2882824109,4.2147117296,3.8827731129,1.2370564683,0.6520321669,4.1917317292,2.0881598221,1.6509623903,2.2228477689,2.4783842805,1.0691892284,2.5712392313,1.9284151541,12.238022919,5.8574222995,13.353812023,18.325939932,26.284529274,28.431096573,27.898189844,19.924975536,16.072454164,14.389609042,13.475079387,6.5094544664,17.545543752,20.414099754,27.935491665,30.653944341,30.376574125,20.994164764,18.643693395,16.318024196 +050,4,8,30,033,Montana,Garfield County,1206,1209,1192,1254,1244,1254,1274,1283,1295,1279,1262,1272,1268,-17,62,-10,10,20,9,12,-16,-17,10,-4,3,15,14,11,7,18,16,17,15,18,15,5,10,8,16,9,21,14,11,15,9,12,-2,5,6,-5,-2,-3,2,6,0,9,3,0,0,0,0,0,0,0,0,0,0,0,-15,56,-16,14,21,12,10,-22,-16,1,-7,-15,56,-16,14,21,12,10,-22,-16,1,-7,0,1,0,1,1,0,0,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,12.264922322,11.208967174,8.8070456365,5.5379746835,14.078998827,12.412723041,13.209013209,11.806375443,14.206787687,11.811023622,8.1766148814,6.4051240993,12.810248199,7.1202531646,16.425498631,10.861132661,8.547008547,11.806375443,7.1033938437,9.4488188976,4.0883074407,4.8038430745,-4.003202562,-1.582278481,-2.346499804,1.5515903801,4.662004662,0,7.1033938437,2.3622047244,0,0,0,0,0,0,0,0,0,0,45.789043336,-12.8102482,11.208967174,16.613924051,9.3859992178,7.7579519007,-17.09401709,-12.59346714,0.7892659826,-5.511811024,45.789043336,-12.8102482,11.208967174,16.613924051,9.3859992178,7.7579519007,-17.09401709,-12.59346714,0.7892659826,-5.511811024 +050,4,8,30,035,Montana,Glacier County,13399,13399,13421,13579,13671,13793,13711,13647,13707,13729,13797,13701,13594,22,158,92,122,-82,-64,60,22,68,-96,-107,44,274,236,254,256,249,227,234,230,224,206,49,127,148,131,146,126,141,158,163,142,152,-5,147,88,123,110,123,86,76,67,82,54,9,19,5,25,9,7,8,55,2,9,5,17,-8,1,-24,-204,-197,-34,-108,0,-187,-167,26,11,6,1,-195,-190,-26,-53,2,-178,-162,1,0,-2,-2,3,3,0,-1,-1,0,1,690,690,690,690,690,690,690,689,690,690,690,690,20.296296296,17.321100917,18.496941451,18.615474113,18.203085021,16.59720699,17.057880157,16.711472789,16.29209397,15.094339623,9.4074074074,10.862385321,9.5397611419,10.61663758,9.2111996491,10.309278351,11.517713952,11.843348107,10.328023856,11.137570984,10.888888889,6.4587155963,8.9571803088,7.9988365329,8.9918853717,6.2879286393,5.540166205,4.8681246821,5.9640701142,3.9567686389,1.4074074074,0.3669724771,1.8205651034,0.6544502618,0.5117333138,0.5849235944,4.0093308062,0.1453171547,0.6545930613,0.3663674666,-0.592592593,0.0733944954,-1.747742499,-14.83420593,-14.40163755,-2.485925276,-7.872867765,0,-13.60098916,-12.23667338,0.8148148148,0.4403669725,0.0728226041,-14.17975567,-13.88990423,-1.901001682,-3.863536959,0.1453171547,-12.9463961,-11.87030592 +050,4,8,30,037,Montana,Golden Valley County,884,884,879,830,827,846,841,818,811,817,825,827,827,-5,-49,-3,19,-5,-23,-7,6,8,2,0,0,6,7,9,6,8,9,9,8,5,5,5,10,9,13,8,9,10,9,8,3,2,-5,-4,-2,-4,-2,-1,-1,0,0,2,3,0,0,0,0,0,0,0,0,0,0,0,0,-46,0,23,-2,-23,-7,6,8,1,-3,0,-46,0,23,-2,-23,-7,6,8,1,-3,0,1,-1,0,-1,1,1,0,0,-1,0,89,89,89,89,89,89,89,89,89,89,89,89,7.0216500878,8.4490042245,10.759115362,7.1132187315,9.6443640747,11.049723757,11.056511057,9.7442143727,6.0532687651,6.045949214,11.702750146,10.863005432,15.540944411,9.484291642,10.849909584,12.277470841,11.056511057,9.7442143727,3.6319612591,2.4183796856,-4.681100059,-2.414001207,-4.78182905,-2.37107291,-1.205545509,-1.227747084,0,0,2.4213075061,3.6275695284,0,0,0,0,0,0,0,0,0,0,-53.83265067,0,27.495517035,-2.37107291,-27.72754671,-8.594229589,7.371007371,9.7442143727,1.210653753,-3.627569528,-53.83265067,0,27.495517035,-2.37107291,-27.72754671,-8.594229589,7.371007371,9.7442143727,1.210653753,-3.627569528 +050,4,8,30,039,Montana,Granite County,3079,3072,3073,3077,3040,3067,3144,3160,3276,3343,3355,3335,3317,1,4,-37,27,77,16,116,67,12,-20,-18,3,25,19,15,17,25,16,21,18,15,16,9,35,33,34,33,33,32,32,35,32,35,-6,-10,-14,-19,-16,-8,-16,-11,-17,-17,-19,0,2,1,7,2,1,1,0,0,0,1,8,11,-24,38,90,25,129,77,29,-4,0,8,13,-23,45,92,26,130,77,29,-4,1,-1,1,0,1,1,-2,2,1,0,1,0,40,40,40,40,40,40,40,40,40,40,40,40,8.1300813008,6.2121955207,4.9123956116,5.4741587506,7.9314720812,4.9720323182,6.3453693911,5.374738728,4.4843049327,4.8105832832,11.382113821,10.789602746,11.134763386,10.626308163,10.469543147,9.9440646364,9.6691343103,10.45088086,9.5665171898,10.523150932,-3.25203252,-4.577407226,-6.222367775,-5.152149412,-2.538071066,-4.972032318,-3.323764919,-5.076142132,-5.082212257,-5.712567649,0.6504065041,0.326957659,2.2924512854,0.6440186765,0.3172588832,0.3107520199,0,0,0,0.3006614552,3.5772357724,-7.846983816,12.444735549,28.980840444,7.9314720812,40.087010566,23.266354434,8.659301284,-1.195814649,0,4.2276422764,-7.520026157,14.737186835,29.624859121,8.2487309645,40.397762585,23.266354434,8.659301284,-1.195814649,0.3006614552 +050,4,8,30,041,Montana,Hill County,16096,16093,16151,16391,16395,16534,16500,16435,16440,16468,16351,16494,16358,58,240,4,139,-34,-65,5,28,-117,143,-136,73,267,302,303,301,315,296,311,298,282,288,35,145,142,167,126,164,164,152,138,178,176,38,122,160,136,175,151,132,159,160,104,112,9,13,13,13,6,5,16,11,10,20,16,11,105,-169,-7,-219,-223,-141,-142,-287,19,-262,20,118,-156,6,-213,-218,-125,-131,-277,39,-246,0,0,0,-3,4,2,-2,0,0,0,-2,593,593,593,593,593,593,593,593,593,593,593,593,16.409563026,18.422497407,18.403231194,18.223648362,19.12858661,18.007604563,18.901179045,18.160212072,17.171563404,17.533179106,8.911560445,8.6622338803,10.143035015,7.6285039656,9.9590101716,9.9771863118,9.2378752887,8.4097626375,10.838788248,10.714720565,7.4980025813,9.7602635271,8.2601961797,10.595144397,9.1695764384,8.030418251,9.6633037559,9.7504494348,6.332775156,6.8184585413,0.7989674882,0.7930214116,0.789577576,0.3632620936,0.3036283589,0.9733840304,0.6685304485,0.6094030897,1.2178413762,0.9740655059,6.4531989429,-10.30927835,-0.425157156,-13.25906642,-13.54182481,-8.577946768,-8.630120335,-17.48986867,1.1569493074,-15.95032266,7.2521664311,-9.516256939,0.3644204197,-12.89580432,-13.23819645,-7.604562738,-7.961589887,-16.88046558,2.3747906835,-14.97625715 +050,4,8,30,043,Montana,Jefferson County,11406,11403,11406,11373,11319,11457,11505,11576,11774,11918,12084,12211,12360,3,-33,-54,138,48,71,198,144,166,127,149,21,85,74,103,83,83,86,100,86,89,82,32,89,98,110,103,115,86,96,109,112,152,-11,-4,-24,-7,-20,-32,0,4,-23,-23,-70,3,6,5,26,8,3,3,-1,-1,0,0,12,-35,-35,120,63,100,196,140,191,152,221,15,-29,-30,146,71,103,199,139,190,152,221,-1,0,0,-1,-3,0,-1,1,-1,-2,-2,230,230,230,230,230,230,230,230,230,230,230,230,7.4630141797,6.5221223339,9.0446083597,7.2293354237,7.1920627356,7.3661670236,8.4416680736,7.1660694942,7.3266104137,6.674535021,7.814214847,8.637405253,9.6592904812,8.9713439596,9.9649061999,7.3661670236,8.1040013507,9.082576452,9.2200041161,12.372308819,-0.351200667,-2.115282919,-0.614682122,-1.742008536,-2.772843464,0,0.3376667229,-1.916506958,-1.893393702,-5.697773798,0.5268010009,0.4406839415,2.2831050228,0.6968034143,0.2599540748,0.2569593148,-0.084416681,-0.083326389,0,0,-3.073005839,-3.08478759,10.537407798,5.4873268879,8.665135826,16.788008565,11.818335303,15.915340388,12.512862729,17.988685849,-2.546204838,-2.644103649,12.820512821,6.1841303022,8.9250899008,17.04496788,11.733918622,15.832013999,12.512862729,17.988685849 +050,4,8,30,045,Montana,Judith Basin County,2072,2072,2075,2011,2006,2002,1985,1932,1944,1944,1950,2010,1994,3,-64,-5,-4,-17,-53,12,0,6,60,-16,7,16,15,15,16,11,19,12,18,19,19,2,27,24,18,27,14,16,15,16,17,19,5,-11,-9,-3,-11,-3,3,-3,2,2,0,0,0,0,0,1,1,1,0,0,0,0,-2,-52,4,-2,-7,-52,8,4,5,58,-15,-2,-52,4,-2,-6,-51,9,4,5,58,-15,0,-1,0,1,0,1,0,-1,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,7.8316201664,7.4682598954,7.4850299401,8.0260847755,5.6165432729,9.8039215686,6.1728395062,9.2449922958,9.595959596,9.4905094905,13.215859031,11.949215833,8.9820359281,13.544018059,7.1483278019,8.2559339525,7.7160493827,8.2177709296,8.5858585859,9.4905094905,-5.384238864,-4.480955937,-1.497005988,-5.517933283,-1.531784529,1.5479876161,-1.543209877,1.0272213662,1.0101010101,0,0,0,0,0.5016302985,0.510594843,0.515995872,0,0,0,0,-25.45276554,1.9915359721,-0.998003992,-3.511412089,-26.55093184,4.1279669763,2.0576131687,2.5680534155,29.292929293,-7.492507493,-25.45276554,1.9915359721,-0.998003992,-3.009781791,-26.04033699,4.6439628483,2.0576131687,2.5680534155,29.292929293,-7.492507493 +050,4,8,30,047,Montana,Lake County,28746,28748,28792,28983,29021,29138,29236,29482,29722,30277,30346,30586,30986,44,191,38,117,98,246,240,555,69,240,400,82,353,385,389,349,379,334,367,320,291,299,49,273,240,299,285,300,313,318,308,316,370,33,80,145,90,64,79,21,49,12,-25,-71,4,13,29,110,42,-1,10,29,11,26,19,9,101,-135,-80,-4,171,210,474,48,242,455,13,114,-106,30,38,170,220,503,59,268,474,-2,-3,-1,-3,-4,-3,-1,3,-2,-3,-3,587,587,586,586,586,586,587,585,586,585,584,584,12.21981826,13.274946555,13.37712134,11.957378285,12.909159031,11.283021417,12.233537226,10.557049305,9.5516313267,9.7122068473,9.4504543488,8.2752913592,10.282157534,9.7646212355,10.218331687,10.573609891,10.60017667,10.161159956,10.37221821,12.018449945,2.7693639117,4.9996551962,3.0949638061,2.1927570494,2.6908273443,0.7094115262,1.633360556,0.3958893489,-0.820586884,-2.306243098,0.4500216357,0.9999310392,3.7827335408,1.4389968136,-0.034061106,0.3378150125,0.966682778,0.3628985698,0.8534103591,0.6171636458,3.4963219386,-4.65485139,-2.751078939,-0.137047316,5.8244490616,7.0941152625,15.800263338,1.5835573957,7.9432810346,14.779445202,3.9463435742,-3.65492035,1.031654602,1.3019494981,5.790387956,7.431930275,16.766946116,1.9464559656,8.7966913937,15.396608848 +050,4,8,30,049,Montana,Lewis and Clark County,63395,63394,63578,64284,64760,65277,65764,66308,67001,67988,68775,69578,70229,184,706,476,517,487,544,693,987,787,803,651,201,757,729,754,770,778,794,777,754,731,727,174,534,544,526,574,593,577,631,619,668,711,27,223,185,228,196,185,217,146,135,63,16,18,48,29,112,13,3,17,23,13,45,42,134,432,260,185,286,357,462,814,638,697,596,152,480,289,297,299,360,479,837,651,742,638,5,3,2,-8,-8,-1,-3,4,1,-2,-3,1946,1946,1946,1946,1946,1948,1950,1952,1959,1960,1957,1958,11.840890961,11.298471839,11.596699401,11.752047069,11.781452541,11.912173972,11.51204913,11.026374092,10.567172378,10.4000515,8.3527553143,8.4312327578,8.0900051524,8.7606169062,8.9799503301,8.6565798258,9.3489099112,9.0521559194,9.6564584794,10.171164534,3.4881356462,2.8672390812,3.5066942486,2.9914301631,2.8015022109,3.2555941459,2.1631392188,1.974218173,0.9107138985,0.2288869656,0.7508094665,0.4494590992,1.7225866484,0.1984111843,0.0454297656,0.255046546,0.3407685071,0.1901098981,0.6505099275,0.6008282847,6.7572851981,4.0296333034,2.8453440175,4.3650460543,5.4061421043,6.9312649559,12.060241946,9.3300088474,10.075675988,8.5260394687,7.5080946646,4.4790924026,4.5679306659,4.5634572386,5.4515718699,7.1863115018,12.401010453,9.5201187456,10.726185916,9.1268677534 +050,4,8,30,051,Montana,Liberty County,2339,2339,2349,2381,2396,2364,2351,2395,2413,2415,2440,2386,2369,10,32,15,-32,-13,44,18,2,25,-54,-17,6,26,19,25,22,22,27,25,23,29,26,7,24,28,21,25,24,27,11,17,15,24,-1,2,-9,4,-3,-2,0,14,6,14,2,3,4,2,0,0,0,0,0,0,0,0,8,25,22,-36,-11,45,19,-13,20,-68,-19,11,29,24,-36,-11,45,19,-13,20,-68,-19,0,1,0,0,1,1,-1,1,-1,0,0,403,403,403,403,403,403,403,403,403,403,403,403,10.993657505,7.9547833368,10.504201681,9.3319194062,9.2709650232,11.231281198,10.356255178,9.4747682801,12.018234563,10.935856993,10.147991543,11.722838602,8.8235294118,10.604453871,10.113780025,11.231281198,4.5567522784,7.0030895984,6.2163282221,10.094637224,0.8456659619,-3.768055265,1.6806722689,-1.272534464,-0.842815002,0,5.7995028998,2.4716786818,5.8019063407,0.8412197687,1.6913319239,0.8373456144,0,0,0,0,0,0,0,0,10.570824524,9.2108017584,-15.12605042,-4.665959703,18.963337547,7.9034941764,-5.385252693,8.2389289392,-28.18068794,-7.991587802,12.262156448,10.048147373,-15.12605042,-4.665959703,18.963337547,7.9034941764,-5.385252693,8.2389289392,-28.18068794,-7.991587802 +050,4,8,30,053,Montana,Lincoln County,19687,19681,19693,19629,19494,19437,19208,19085,19332,19589,19862,20099,20343,12,-64,-135,-57,-229,-123,247,257,273,237,244,46,171,194,186,174,166,171,169,173,166,176,32,224,244,235,236,262,250,235,238,281,311,14,-53,-50,-49,-62,-96,-79,-66,-65,-115,-135,5,6,1,11,9,16,24,21,12,37,29,-3,-17,-83,-17,-178,-40,301,303,326,316,352,2,-11,-82,-6,-169,-24,325,324,338,353,381,-4,0,-3,-2,2,-3,1,-1,0,-1,-2,209,208,209,209,209,209,209,209,209,209,209,209,8.6974212909,9.9174398691,9.5553671881,9.0050459309,8.6699919045,8.9023088737,8.6842578557,8.7703733746,8.3081003979,8.7038227585,11.39311327,12.473481073,12.07264134,12.213740458,13.683963126,13.015071453,12.075743172,12.065600365,14.063712119,15.380050443,-2.695691979,-2.556041203,-2.517274152,-3.208694527,-5.013971222,-4.112762579,-3.391485316,-3.29522699,-5.755611721,-6.676227684,0.3051726769,0.0511208241,0.5651023606,0.4657782378,0.8356618703,1.2494468595,1.0791089643,0.6083495982,1.8518055104,1.4341526136,-0.864655918,-4.243028398,-0.873340012,-9.212058481,-2.089154676,15.670146029,15.570000771,16.526830752,15.815420035,17.407645517,-0.559483241,-4.191907574,-0.308237651,-8.746280243,-1.253492805,16.919592889,16.649109735,17.13518035,17.667225545,18.841798131 +050,4,8,30,055,Montana,McCone County,1734,1734,1745,1709,1700,1714,1713,1698,1729,1695,1655,1649,1648,11,-36,-9,14,-1,-15,31,-34,-40,-6,-1,5,13,8,15,16,21,19,20,16,14,14,1,22,21,12,26,15,19,26,22,10,18,4,-9,-13,3,-10,6,0,-6,-6,4,-4,0,0,0,0,0,0,0,0,0,0,0,6,-25,4,10,11,-21,31,-26,-35,-10,3,6,-25,4,10,11,-21,31,-26,-35,-10,3,1,-2,0,1,-2,0,0,-2,1,0,0,19,19,19,19,19,19,19,19,19,19,19,19,7.5275043428,4.6934584922,8.7873462214,9.3376130727,12.313104661,11.088415524,11.682242991,9.552238806,8.4745762712,8.4925690021,12.738853503,12.320328542,7.0298769772,15.173621243,8.7950747581,11.088415524,15.186915888,13.134328358,6.0532687651,10.919017288,-5.21134916,-7.62687005,1.7574692443,-5.83600817,3.5180299033,0,-3.504672897,-3.582089552,2.4213075061,-2.426448286,0,0,0,0,0,0,0,0,0,0,-14.47596989,2.3467292461,5.8582308143,6.4196089875,-12.31310466,18.091625328,-15.18691589,-20.89552239,-6.053268765,1.8198362147,-14.47596989,2.3467292461,5.8582308143,6.4196089875,-12.31310466,18.091625328,-15.18691589,-20.89552239,-6.053268765,1.8198362147 +050,4,8,30,057,Montana,Madison County,7691,7691,7696,7644,7664,7679,7832,8033,8074,8280,8586,8749,8959,5,-52,20,15,153,201,41,206,306,163,210,12,67,57,64,50,59,59,68,69,71,78,8,83,71,78,72,56,90,99,73,65,82,4,-16,-14,-14,-22,3,-31,-31,-4,6,-4,0,2,-1,12,51,63,14,22,12,27,21,1,-36,35,17,122,134,59,213,298,129,194,1,-34,34,29,173,197,73,235,310,156,215,0,-2,0,0,2,1,-1,2,0,1,-1,163,163,163,163,163,163,163,163,163,163,163,163,8.7353324641,7.4470864907,8.3425666428,6.4470375862,7.4377560668,7.326007326,8.316008316,8.1821415866,8.1915200461,8.809577592,10.821382008,9.2761954534,10.167503096,9.2837341242,7.0595650804,11.175265413,12.107129754,8.6564686351,7.4992789155,9.2613508019,-2.086049544,-1.829108963,-1.824936453,-2.836696538,0.3781909864,-3.849258087,-3.791121438,-0.474327048,0.6922411307,-0.45177321,0.260756193,-0.13065064,1.5642312455,6.575978338,7.9420107154,1.7383746197,2.6904732787,1.4229811455,3.115085088,2.3718093517,-4.693611473,4.5727724066,2.2159942645,15.73077171,16.892530728,7.326007326,26.048673107,35.337365113,14.883184309,21.911000678,-4.43285528,4.4421217664,3.78022551,22.306750048,24.834541443,9.0643819457,28.739146386,36.760346259,17.998269397,24.282810029 +050,4,8,30,059,Montana,Meagher County,1891,1891,1878,1878,1887,1905,1857,1822,1851,1856,1847,1841,1831,-13,0,9,18,-48,-35,29,5,-9,-6,-10,3,25,22,20,16,17,26,14,15,20,19,11,31,24,28,30,31,18,21,24,19,23,-8,-6,-2,-8,-14,-14,8,-7,-9,1,-4,-1,2,1,2,1,0,3,3,1,4,3,-3,4,9,24,-35,-21,18,9,0,-9,-10,-4,6,10,26,-34,-21,21,12,1,-5,-7,-1,0,1,0,0,0,0,0,-1,-2,1,174,174,174,174,174,174,174,174,174,174,174,174,13.312034079,11.686586985,10.548523207,8.5061137693,9.2416417505,14.157364552,7.553277583,8.1015392925,10.845986985,10.348583878,16.506922258,12.749003984,14.767932489,15.948963317,16.852405545,9.8012523822,11.329916374,12.962462868,10.303687636,12.527233115,-3.194888179,-1.062416999,-4.219409283,-7.442849548,-7.610763795,4.3561121699,-3.776638791,-4.860923575,0.5422993492,-2.178649237,1.0649627263,0.5312084993,1.0548523207,0.5316321106,0,1.6335420637,1.6185594821,0.5401026195,2.169197397,1.6339869281,2.1299254526,4.780876494,12.658227848,-18.60712387,-11.41614569,9.8012523822,4.8556784462,0,-4.880694143,-5.446623094,3.1948881789,5.3120849934,13.713080169,-18.07549176,-11.41614569,11.434794446,6.4742379282,0.5401026195,-2.711496746,-3.812636166 +050,4,8,30,061,Montana,Mineral County,4223,4230,4230,4221,4130,4230,4196,4194,4129,4240,4314,4422,4544,0,-9,-91,100,-34,-2,-65,111,74,108,122,16,45,49,44,39,44,46,35,43,41,43,16,49,45,49,57,54,58,62,46,45,58,0,-4,4,-5,-18,-10,-12,-27,-3,-4,-15,0,0,-1,0,-1,-2,-2,-1,-1,-1,-1,0,-5,-97,105,-13,9,-51,140,77,114,140,0,-5,-98,105,-14,7,-53,139,76,113,139,0,0,3,0,-2,1,0,-1,1,-1,-2,22,22,22,22,22,22,22,22,22,22,22,22,10.649627263,11.735121542,10.526315789,9.2570614764,10.488676996,11.053706596,8.3642012188,10.053776011,9.3864468864,9.5917912112,11.596260798,10.777152437,11.722488038,13.529551389,12.872467223,13.93728223,14.816585016,10.755202245,10.302197802,12.93776489,-0.946633534,0.9579691055,-1.196172249,-4.272489912,-2.383790226,-2.883575634,-6.452383797,-0.701426233,-0.915750916,-3.345973678,0,-0.239492276,0,-0.237360551,-0.476758045,-0.480595939,-0.238977178,-0.233808744,-0.228937729,-0.223064912,-1.183291918,-23.23075081,25.119617225,-3.085687159,2.1454112038,-12.25519644,33.456804875,18.003273322,26.098901099,31.229087665,-1.183291918,-23.47024308,25.119617225,-3.323047709,1.6686531585,-12.73579238,33.217827697,17.769464578,25.86996337,31.006022753 +050,4,8,30,063,Montana,Missoula County,109299,109295,109471,110270,111104,111988,112924,114281,116587,118068,118959,120066,121630,176,799,834,884,936,1357,2306,1481,891,1107,1564,321,1201,1215,1222,1258,1243,1256,1191,1070,1058,1057,214,803,759,826,841,864,869,980,872,908,973,107,398,456,396,417,379,387,211,198,150,84,51,110,52,384,126,122,258,176,124,304,237,23,292,331,122,406,851,1653,1084,567,649,1242,74,402,383,506,532,973,1911,1260,691,953,1479,-5,-1,-5,-18,-13,5,8,10,2,4,1,3634,3634,3631,3628,3637,3638,3637,3642,3643,3644,3646,3644,10.931050646,10.976898823,10.955121654,11.186597425,10.941660615,10.880676404,10.151072852,9.0285073009,8.852630478,8.7465245598,7.3086042204,6.8571738325,7.4050167644,7.4784804724,7.605466429,7.5281113017,8.3526879887,7.3578115573,7.5975316389,8.0514365153,3.6224464256,4.1197249903,3.5501048895,3.7081169524,3.3361941859,3.3525651021,1.7983848629,1.6706957435,1.255098839,0.6950880445,1.0011786603,0.4697932006,3.4425259534,1.1204382158,1.0739200282,2.2350434014,1.5000745776,1.046294304,2.5436669804,1.9611412684,2.657674262,2.9904144118,1.0937191831,3.6103009177,7.4910323276,14.319871095,9.2390956937,4.7842650837,5.4303943102,10.277373229,3.6588529223,3.4602076125,4.5362451365,4.7307391335,8.5649523558,16.554914497,10.739170271,5.8305593877,7.9740612907,12.238514498 +050,4,8,30,065,Montana,Musselshell County,4538,4538,4555,4747,4693,4684,4647,4631,4640,4623,4623,4626,4669,17,192,-54,-9,-37,-16,9,-17,0,3,43,10,48,42,37,36,46,38,39,46,46,45,4,63,60,50,53,47,53,62,70,73,73,6,-15,-18,-13,-17,-1,-15,-23,-24,-27,-28,0,5,0,26,7,6,1,0,0,0,0,12,200,-36,-22,-25,-22,24,7,24,30,71,12,205,-36,4,-18,-16,25,7,24,30,71,-1,2,0,0,-2,1,-1,-1,0,0,0,52,52,52,52,52,52,52,52,52,52,52,52,10.320361213,8.8983050847,7.8916497814,7.716214768,9.9159301574,8.1976054363,8.4205980784,9.9502487562,9.9470212996,9.6826250672,13.545474092,12.711864407,10.664391596,11.359982853,10.131493856,11.433502319,13.386591817,15.14168289,15.785490323,15.707369554,-3.225112879,-3.813559322,-2.772741815,-3.643768085,-0.215563699,-3.235896883,-4.965993739,-5.191434134,-5.838469024,-6.024744486,1.0750376263,0,5.5454836302,1.5003750938,1.2933821944,0.2157264589,0,0,0,0,43.001505053,-7.627118644,-4.692332302,-5.358482478,-4.74240138,5.1774350124,1.5113893987,5.1914341337,6.4871878041,15.277030662,44.076542679,-7.627118644,0.8531513277,-3.858107384,-3.449019185,5.3931614713,1.5113893987,5.1914341337,6.4871878041,15.277030662 +050,4,8,30,067,Montana,Park County,15636,15635,15595,15512,15597,15705,15926,16013,16138,16392,16662,16612,16760,-40,-83,85,108,221,87,125,254,270,-50,148,34,160,130,144,150,140,151,141,162,156,157,39,140,150,133,156,167,149,157,147,154,181,-5,20,-20,11,-6,-27,2,-16,15,2,-24,5,2,0,10,13,25,5,5,0,4,4,-42,-103,102,89,211,90,118,263,253,-57,169,-37,-101,102,99,224,115,123,268,253,-53,173,2,-2,3,-2,3,-1,0,2,2,1,-1,108,108,108,108,108,108,108,108,108,108,108,108,10.287073649,8.3577099875,9.2006900518,9.4843666024,8.7667115439,9.393175951,8.668920996,9.8021419495,9.3766905091,9.4090854609,9.0011894429,9.643511524,8.4978595617,9.8637412665,10.457434484,9.2687630245,9.6526283431,8.8945362135,9.2564765282,10.847416996,1.2858842061,-1.285801537,0.7028304901,-0.379374664,-1.690722941,0.1244129265,-0.983707347,0.9076057361,0.1202139809,-1.438331535,0.1285884206,0,0.6389368091,0.8219784389,1.5654842043,0.3110323163,0.307408546,0,0.2404279618,0.2397219226,-6.622303662,6.5575878363,5.6865376014,13.341342354,5.6357431354,7.3403626637,16.169689517,15.308283415,-3.426098455,10.128251229,-6.493715241,6.5575878363,6.3254744106,14.163320793,7.2012273396,7.6513949799,16.477098063,15.308283415,-3.185670493,10.367973151 +050,4,8,30,069,Montana,Petroleum County,494,488,489,491,505,505,489,475,491,512,517,497,500,1,2,14,0,-16,-14,16,21,5,-20,3,1,3,4,4,3,3,0,2,2,2,2,3,1,6,5,3,3,3,5,2,3,6,-2,2,-2,-1,0,0,-3,-3,0,-1,-4,0,0,0,0,0,0,0,0,0,0,0,3,0,16,1,-16,-14,20,24,4,-18,7,3,0,16,1,-16,-14,20,24,4,-18,7,0,0,0,0,0,0,-1,0,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,6.1224489796,8.0321285141,7.9207920792,6.0362173038,6.22406639,0,3.9880358923,3.8872691934,3.9447731755,4.0120361083,2.0408163265,12.048192771,9.900990099,6.0362173038,6.22406639,6.2111801242,9.9700897308,3.8872691934,5.9171597633,12.036108325,4.0816326531,-4.016064257,-1.98019802,0,0,-6.211180124,-5.982053838,0,-1.972386588,-8.024072217,0,0,0,0,0,0,0,0,0,0,0,32.128514056,1.9801980198,-32.19315895,-29.04564315,41.407867495,47.856430708,7.7745383868,-35.50295858,14.042126379,0,32.128514056,1.9801980198,-32.19315895,-29.04564315,41.407867495,47.856430708,7.7745383868,-35.50295858,14.042126379 +050,4,8,30,071,Montana,Phillips County,4253,4252,4252,4186,4123,4163,4174,4150,4121,4117,4047,3955,3919,0,-66,-63,40,11,-24,-29,-4,-70,-92,-36,6,46,44,46,63,63,60,49,44,48,44,11,65,54,61,63,48,42,41,60,46,45,-5,-19,-10,-15,0,15,18,8,-16,2,-1,0,-1,12,0,-1,0,0,0,0,0,0,6,-45,-67,54,12,-40,-48,-12,-53,-94,-34,6,-46,-55,54,11,-40,-48,-12,-53,-94,-34,-1,-1,2,1,0,1,1,0,-1,0,-1,127,127,127,127,127,127,127,127,127,127,127,127,10.903057597,10.590925502,11.103065412,15.113350126,15.136953388,14.508523758,11.896091284,10.779029887,11.99700075,11.176022352,15.40649443,12.997954026,14.72363022,15.113350126,11.532916867,10.15596663,9.9538722991,14.698677119,11.497125719,11.43002286,-4.503436833,-2.407028523,-3.620564808,0,3.6040365209,4.3525571273,1.9422189852,-3.919647232,0.4998750312,-0.254000508,-0.237022991,2.8884342279,0,-0.239894446,0,0,0,0,0,0,-10.66603461,-16.12709111,13.034033309,2.8787333573,-9.610764056,-11.60681901,-2.913328478,-12.98383146,-23.49412647,-8.636017272,-10.9030576,-13.23865688,13.034033309,2.6388389109,-9.610764056,-11.60681901,-2.913328478,-12.98383146,-23.49412647,-8.636017272 +050,4,8,30,073,Montana,Pondera County,6153,6155,6161,6195,6152,6218,6140,6100,6024,5954,5936,5858,5782,6,34,-43,66,-78,-40,-76,-70,-18,-78,-76,15,78,72,70,67,85,73,87,71,63,55,15,66,69,73,75,61,78,75,68,76,61,0,12,3,-3,-8,24,-5,12,3,-13,-6,6,9,5,21,4,7,7,5,3,10,8,1,12,-52,48,-74,-72,-77,-87,-24,-75,-77,7,21,-47,69,-70,-65,-70,-82,-21,-65,-69,-1,1,1,0,0,1,-1,0,0,0,-1,645,645,645,645,645,645,645,645,645,645,645,645,12.625445128,11.662752086,11.317704123,10.843178508,13.888888889,12.042230287,14.526632159,11.942809083,10.683398338,9.4501718213,10.683068954,11.176804082,11.802748585,12.137886389,9.9673202614,12.867040581,12.522958758,11.438183347,12.887909106,10.481099656,1.9423761735,0.4859480036,-0.485044462,-1.294707882,3.9215686275,-0.824810294,2.0036734012,0.5046257359,-2.204510768,-1.030927835,1.4567821301,0.8099133393,3.3953112369,0.6473539408,1.1437908497,1.1547344111,0.8348639172,0.5046257359,1.695777514,1.3745704467,1.9423761735,-8.423098728,7.7607113985,-11.9760479,-11.76470588,-12.70207852,-14.52663216,-4.037005887,-12.71833135,-13.23024055,3.3991583037,-7.613185389,11.156022635,-11.32869396,-10.62091503,-11.54734411,-13.69176824,-3.532380151,-11.02255384,-11.8556701 +050,4,8,30,075,Montana,Powder River County,1743,1743,1739,1739,1754,1754,1777,1768,1747,1748,1729,1688,1681,-4,0,15,0,23,-9,-21,1,-19,-41,-7,4,6,12,9,10,17,19,21,18,18,18,6,26,24,21,16,20,22,20,13,19,16,-2,-20,-12,-12,-6,-3,-3,1,5,-1,2,0,0,0,0,0,0,0,4,0,0,0,-3,20,28,12,28,-6,-18,-4,-24,-41,-9,-3,20,28,12,28,-6,-18,0,-24,-41,-9,1,0,-1,0,1,0,0,0,0,1,0,35,35,35,35,35,35,35,35,35,35,35,35,3.4502587694,6.8708846264,5.1311288483,5.6641178137,9.5909732017,10.810810811,12.017167382,10.353753236,10.535557507,10.685663402,14.951121334,13.741769253,11.972633979,9.0625885018,11.283497884,12.517780939,11.444921316,7.4777106701,11.120866257,9.4983674681,-11.50086256,-6.870884626,-6.841505131,-3.398470688,-1.692524683,-1.706970128,0.5722460658,2.8760425654,-0.58530875,1.1872959335,0,0,0,0,0,0,2.2889842632,0,0,0,11.500862565,16.032064128,6.8415051311,15.859529878,-3.385049365,-10.24182077,-2.288984263,-13.80500431,-23.99765876,-5.342831701,11.500862565,16.032064128,6.8415051311,15.859529878,-3.385049365,-10.24182077,0,-13.80500431,-23.99765876,-5.342831701 +050,4,8,30,077,Montana,Powell County,7027,7034,7019,7084,7078,6953,6876,6793,6837,6785,6920,6854,6817,-15,65,-6,-125,-77,-83,44,-52,135,-66,-37,14,56,62,42,44,55,58,49,62,53,52,27,74,69,81,71,76,86,84,78,67,91,-13,-18,-7,-39,-27,-21,-28,-35,-16,-14,-39,0,0,0,0,0,0,2,7,1,2,1,-1,82,3,-88,-50,-62,69,-23,148,-52,2,-1,82,3,-88,-50,-62,71,-16,149,-50,3,-1,1,-2,2,0,0,1,-1,2,-2,-1,1523,1523,1558,1543,1523,1531,1523,1543,1561,1700,1699,1699,7.941572715,8.7558254484,5.9867436391,6.3634391496,8.0474065403,8.5106382979,7.1942446043,9.0477927764,7.695658487,7.6073440129,10.494221088,9.7443863861,11.545862733,10.26827681,11.120052674,12.619222304,12.33299075,11.382707041,9.7284739364,13.312852023,-2.552648373,-0.988560938,-5.559119093,-3.90483766,-3.072646134,-4.108584006,-5.138746146,-2.334914265,-2.032815449,-5.70550801,0,0,0,0,0,0.2934702861,1.0277492292,0.1459321416,0.2904022071,0.1462950772,11.628731476,0.4236689733,-12.54365334,-7.231180852,-9.071621918,10.124724872,-3.376890324,21.59795695,-7.550457383,0.2925901543,11.628731476,0.4236689733,-12.54365334,-7.231180852,-9.071621918,10.418195158,-2.349141095,21.743889092,-7.260055176,0.4388852315 +050,4,8,30,079,Montana,Prairie County,1179,1179,1183,1141,1141,1163,1125,1140,1159,1097,1056,1064,1067,4,-42,0,22,-38,15,19,-62,-41,8,3,2,10,16,11,12,16,12,11,16,17,19,9,18,16,22,18,16,23,17,24,10,9,-7,-8,0,-11,-6,0,-11,-6,-8,7,10,0,2,2,2,2,0,0,0,0,0,0,10,-37,-2,30,-35,15,30,-57,-32,2,-7,10,-35,0,32,-33,15,30,-57,-32,2,-7,1,1,0,1,1,0,0,1,-1,-1,0,21,21,21,21,21,21,21,21,21,21,21,21,8.6058519793,14.022787029,9.5486111111,10.48951049,14.12803532,10.439321444,9.7517730496,14.862981886,16.037735849,17.832003754,15.490533563,14.022787029,19.097222222,15.734265734,14.12803532,20.008699435,15.070921986,22.294472829,9.4339622642,8.4467386204,-6.884681583,0,-9.548611111,-5.244755245,0,-9.56937799,-5.319148936,-7.431490943,6.6037735849,9.3852651337,1.7211703959,1.7528483786,1.7361111111,1.7482517483,0,0,0,0,0,0,-31.84165232,-1.752848379,26.041666667,-30.59440559,13.245033113,26.09830361,-50.53191489,-29.72596377,1.8867924528,-6.569685594,-30.12048193,0,27.777777778,-28.84615385,13.245033113,26.09830361,-50.53191489,-29.72596377,1.8867924528,-6.569685594 +050,4,8,30,081,Montana,Ravalli County,40212,40210,40323,40387,40596,40698,40786,41199,41975,42617,43377,44149,45002,113,64,209,102,88,413,776,642,760,772,853,116,376,378,377,385,396,385,382,392,389,393,123,403,384,426,446,410,432,516,412,498,529,-7,-27,-6,-49,-61,-14,-47,-134,-20,-109,-136,19,35,12,11,-9,-14,-2,13,9,35,28,100,59,206,143,164,438,825,762,771,850,967,119,94,218,154,155,424,823,775,780,885,995,1,-3,-3,-3,-6,3,0,1,0,-4,-6,478,478,477,477,477,478,479,479,478,478,479,478,9.3173088837,9.3352925923,9.2749772431,9.4497079181,9.6603037141,9.2577007238,9.0315869113,9.1169151336,8.8887873318,8.8165023387,9.9863709577,9.4834718398,10.480478264,10.946934367,10.001829603,10.387861591,12.1997352,9.5820638649,11.379475813,11.867505693,-0.669062074,-0.148179247,-1.205501021,-1.497226449,-0.341525889,-1.130160868,-3.168148288,-0.465148731,-2.490688481,-3.051003354,0.8673026886,0.296358495,0.2706226782,-0.220902263,-0.341525889,-0.048091952,0.3073576698,0.2093169291,0.7997623563,0.6281477493,1.4620245323,5.0874874974,3.5180948163,4.0253301262,10.684881381,19.837930122,18.015888027,17.931483592,19.422800082,21.6935312,2.3293272209,5.3838459924,3.7887174945,3.8044278631,10.343355492,19.789838171,18.323245697,18.140800521,20.222562439,22.321678949 +050,4,8,30,083,Montana,Richland County,9746,9746,9760,10151,10791,11173,11555,11931,11442,11101,10955,10943,11043,14,391,640,382,382,376,-489,-341,-146,-12,100,31,131,143,154,186,174,165,150,133,160,152,17,83,114,94,100,83,87,91,94,93,85,14,48,29,60,86,91,78,59,39,67,67,1,-2,-5,-7,-12,0,-6,30,-3,-3,-2,0,342,590,319,299,281,-565,-431,-184,-75,36,1,340,585,312,287,281,-571,-401,-187,-78,34,-1,3,26,10,9,4,4,1,2,-1,-1,34,34,34,34,34,34,34,34,34,34,34,34,13.158555572,13.656766307,14.02294664,16.367476241,14.817337989,14.118855089,13.307900457,12.060210374,14.613206686,13.826980806,8.3371000954,10.887212301,8.5594609361,8.799718409,7.0680405348,7.4444872289,8.0734596105,8.5237577077,8.493926386,7.7321932139,4.8214554769,2.7695540063,5.4634857039,7.5677578317,7.7492974538,6.6743678604,5.2344408464,3.5364526659,6.1192802996,6.0947875921,-0.200893978,-0.477509311,-0.637406665,-1.055966209,0,-0.513412912,2.6615800914,-0.27203482,-0.273997625,-0.181933958,34.352870273,56.346098749,29.047532326,26.311158043,23.92914928,-48.34638258,-38.23803398,-16.68480232,-6.849940634,3.2748112435,34.151976295,55.868589437,28.41012566,25.255191834,23.92914928,-48.85979549,-35.57645389,-16.95683714,-7.123938259,3.0928772855 +050,4,8,30,085,Montana,Roosevelt County,10425,10425,10444,10496,10854,11087,11283,11416,11223,11156,11084,11027,10964,19,52,358,233,196,133,-193,-67,-72,-57,-63,59,196,223,232,241,257,245,249,208,194,205,39,114,111,127,155,173,128,137,109,132,179,20,82,112,105,86,84,117,112,99,62,26,1,0,0,0,2,4,7,6,6,11,8,-2,-29,240,122,107,46,-318,-187,-177,-129,-97,-1,-29,240,122,109,50,-311,-181,-171,-118,-89,0,-1,6,6,1,-1,1,2,0,-1,0,186,186,186,186,186,186,186,186,185,186,186,186,18.720152818,20.889929742,21.147623171,21.54671435,22.644169347,21.644065551,22.253005049,18.705035971,17.547826874,18.643990723,10.888252149,10.398126464,11.576500615,13.857845329,15.242962245,11.307919961,12.243621252,9.8021582734,11.939758491,16.279387022,7.8319006686,10.491803279,9.5711225559,7.688869021,7.4012071016,10.336145589,10.009383797,8.9028776978,5.6080683823,2.3646037015,0,0,0,0.1788109075,0.3524384334,0.6184018729,0.5362169891,0.5395683453,0.9949798743,0.7275703697,-2.769818529,22.482435597,11.120732875,9.5663835494,4.0530419842,-28.09311365,-16.71209616,-15.91726619,-11.66840034,-8.821790733,-2.769818529,22.482435597,11.120732875,9.7451944569,4.4054804176,-27.47471178,-16.17587917,-15.37769784,-10.67342047,-8.094220363 +050,4,8,30,087,Montana,Rosebud County,9233,9239,9245,9328,9349,9303,9327,9355,9263,9225,9047,8955,8836,6,83,21,-46,24,28,-92,-38,-178,-92,-119,41,138,167,181,174,149,173,134,143,122,118,32,82,63,100,81,90,93,98,79,84,107,9,56,104,81,93,59,80,36,64,38,11,2,1,-1,17,7,9,10,10,9,16,11,-4,27,-85,-148,-76,-39,-183,-85,-251,-148,-140,-2,28,-86,-131,-69,-30,-173,-75,-242,-132,-129,-1,-1,3,4,0,-1,1,1,0,2,-1,65,65,65,65,65,65,65,65,65,65,65,65,14.860281053,17.882957648,19.408106369,18.679549114,15.951182957,18.584165861,14.495889225,15.652364273,13.55404955,13.265134057,8.8300220751,6.7462654602,10.722710701,8.6956521739,9.6349427256,9.9903319368,10.601471225,8.6471103327,9.3322964115,12.028553763,6.0302589781,11.136692188,8.685395668,9.9838969404,6.3162402312,8.5938339242,3.8944180009,7.0052539405,4.2217531385,1.2365802934,0.107683196,-0.107083579,1.8228608192,0.7514761138,0.9634942726,1.0742292405,1.081782778,0.9851138354,1.7775802689,1.2365802934,2.907446293,-9.102104192,-15.86961184,-8.158883521,-4.175141848,-19.6583951,-9.195153613,-27.4737303,-16.44261749,-15.73829464,3.015129489,-9.209187771,-14.04675102,-7.407407407,-3.211647575,-18.58416586,-8.113370835,-26.48861646,-14.66503722,-14.50171435 +050,4,8,30,089,Montana,Sanders County,11413,11413,11395,11402,11379,11314,11316,11298,11472,11702,11744,11946,12157,-18,7,-23,-65,2,-18,174,230,42,202,211,25,84,88,109,114,128,113,126,99,96,98,19,132,124,138,151,147,149,155,158,128,148,6,-48,-36,-29,-37,-19,-36,-29,-59,-32,-50,3,10,6,1,-5,-3,1,1,1,2,1,-26,45,10,-37,45,6,208,258,102,233,262,-23,55,16,-36,40,3,209,259,103,235,263,-1,0,-3,0,-1,-2,1,0,-2,-1,-2,188,188,188,188,188,188,188,188,188,188,188,188,7.3693907093,7.7257363592,9.6064865818,10.07512152,11.320420978,9.9253403601,10.874255631,8.4449373027,8.1046855213,8.1317678297,11.580471115,10.88626487,12.16234081,13.345117101,13.000795967,13.087395696,13.377060499,13.477778726,10.806247362,12.280628967,-4.211080405,-3.160528511,-2.555854228,-3.269995581,-1.680374989,-3.162055336,-2.502804868,-5.032841423,-2.70156184,-4.148861138,0.8773084178,0.5267547518,0.0881329044,-0.441891295,-0.265322367,0.0878348704,0.0863036161,0.085302397,0.168847615,0.0829772228,3.94788788,0.8779245863,-3.260917464,3.9770216527,0.5306447334,18.269653052,22.266332959,8.7008444937,19.670747151,21.740032361,4.8251962978,1.404679338,-3.172784559,3.5351303579,0.2653223667,18.357487923,22.352636575,8.7861468907,19.839594766,21.823009584 +050,4,8,30,091,Montana,Sheridan County,3384,3384,3368,3418,3549,3626,3661,3673,3609,3461,3379,3318,3261,-16,50,131,77,35,12,-64,-148,-82,-61,-57,4,32,38,41,38,51,45,37,40,37,37,21,66,46,58,65,53,54,55,37,37,50,-17,-34,-8,-17,-27,-2,-9,-18,3,0,-13,0,0,0,1,10,13,0,0,0,1,0,1,83,134,90,50,1,-54,-133,-83,-63,-44,1,83,134,91,60,14,-54,-133,-83,-62,-44,0,1,5,3,2,0,-1,3,-2,1,0,85,85,85,85,85,85,85,85,85,85,85,85,9.431181845,10.908568968,11.428571429,10.429532043,13.907826561,12.359241966,10.466760962,11.695906433,11.049723757,11.247910017,19.451812555,13.205109803,16.167247387,17.839989022,14.453231524,14.83109036,15.558698727,10.81871345,11.049723757,15.199878401,-10.02063071,-2.296540835,-4.738675958,-7.410456978,-0.545404963,-2.471848393,-5.091937765,0.8771929825,0,-3.951968384,0,0,0.2787456446,2.7446136956,3.5451322607,0,0,0,0.2986411826,0,24.46212791,38.467058992,25.087108014,13.723068478,0.2727024816,-14.83109036,-37.62376238,-24.26900585,-18.81439451,-13.37589299,24.46212791,38.467058992,25.365853659,16.467682174,3.8178347423,-14.83109036,-37.62376238,-24.26900585,-18.51575332,-13.37589299 +050,4,8,30,093,Montana,Silver Bow County,34200,34211,34235,34420,34496,34610,34801,34746,34768,34859,34768,34901,35180,24,185,76,114,191,-55,22,91,-91,133,279,94,397,426,390,380,405,406,388,382,340,369,122,401,394,402,416,396,423,428,429,414,448,-28,-4,32,-12,-36,9,-17,-40,-47,-74,-79,30,47,16,173,109,97,96,46,36,79,59,25,140,37,-40,120,-160,-56,88,-82,129,301,55,187,53,133,229,-63,40,134,-46,208,360,-3,2,-9,-7,-2,-1,-1,-3,2,-1,-2,998,998,998,998,992,998,997,998,997,998,999,999,11.565071735,12.362876545,11.287008364,10.94927317,11.646800006,11.68110021,11.145101757,10.972754822,9.7604386456,10.530671651,11.681596388,11.434209763,11.634300929,11.986572733,11.387982228,12.170210317,12.294081319,12.322805808,11.88476941,12.785205691,-0.116524652,0.9286667828,-0.347292565,-1.037299563,0.2588177779,-0.489110107,-1.148979563,-1.350050986,-2.124330764,-2.254534039,1.3691646639,0.4643333914,5.0068011461,3.1407125672,2.7894804952,2.7620335472,1.3213264969,1.0340816063,2.2678666265,1.683765928,4.0783628286,1.0737709676,-1.157641883,3.4576652116,-4.601204941,-1.611186236,2.5277550376,-2.355408103,3.7032252508,8.5900600733,5.4475274925,1.5381043589,3.8491592626,6.5983777787,-1.811724445,1.1508473113,3.8490815345,-1.321326497,5.9710918773,10.273826001 +050,4,8,30,095,Montana,Stillwater County,9117,9093,9112,9153,9161,9250,9230,9419,9349,9408,9496,9671,9888,19,41,8,89,-20,189,-70,59,88,175,217,31,79,79,83,92,87,71,87,89,77,92,11,84,81,91,91,96,101,83,88,75,89,20,-5,-2,-8,1,-9,-30,4,1,2,3,0,0,0,22,14,14,12,6,5,10,8,-2,45,10,75,-35,184,-53,50,83,164,207,-2,45,10,97,-21,198,-41,56,88,174,215,1,1,0,0,0,0,1,-1,-1,-1,-1,112,112,112,112,112,112,112,112,112,112,112,112,8.6504243088,8.6272796768,9.0163489218,9.9567099567,9.3302589951,7.5660699062,9.2765367596,9.4159966145,8.0346428758,9.4074339179,9.1979195182,8.8456918205,9.8853946011,9.8484848485,10.295458202,10.763000853,8.8500293224,9.3101988997,7.825950853,9.1006697684,-0.547495209,-0.218412144,-0.869045679,0.1082251082,-0.965199206,-3.196930946,0.4265074372,0.1057977148,0.2086920227,0.3067641495,0,0,2.3898756178,1.5151515152,1.5014209877,1.2787723785,0.6397611558,0.5289885738,1.0434601137,0.818037732,4.9274568848,1.0920607186,8.1473032426,-3.787878788,19.732961553,-5.647911338,5.3313429653,8.7812103259,17.112745865,21.166726315,4.9274568848,1.0920607186,10.53717886,-2.272727273,21.234382541,-4.36913896,5.9711041211,9.3101988997,18.156205979,21.984764047 +050,4,8,30,097,Montana,Sweet Grass County,3651,3651,3617,3584,3579,3657,3637,3618,3610,3668,3701,3717,3684,-34,-33,-5,78,-20,-19,-8,58,33,16,-33,13,27,25,39,25,31,33,35,28,30,27,14,50,34,47,49,40,44,36,25,35,40,-1,-23,-9,-8,-24,-9,-11,-1,3,-5,-13,0,0,0,6,3,2,1,0,0,0,0,-35,-9,5,78,2,-11,3,59,30,22,-20,-35,-9,5,84,5,-9,4,59,30,22,-20,2,-1,-1,2,-1,-1,-1,0,0,-1,0,45,45,45,45,45,45,45,45,45,45,45,45,7.498958478,6.9803155103,10.779436153,6.8549492734,8.5458304618,9.1311566132,9.6180269305,7.5994029041,8.08843354,7.2963113093,13.886960144,9.493229094,12.990602543,13.435700576,11.026878015,12.174875484,9.8928276999,6.7851811643,9.4365057967,10.809350088,-6.388001666,-2.512913584,-2.21116639,-6.580751302,-2.481047553,-3.043718871,-0.274800769,0.8142217397,-1.348072257,-3.513038779,0,0,1.6583747927,0.8225939128,0.5513439008,0.2767017156,0,0,0,0,-2.499652826,1.3960631021,21.558872305,0.5483959419,-3.032391454,0.8301051467,16.213245397,8.1422173972,5.9315179294,-5.404675044,-2.499652826,1.3960631021,23.217247098,1.3709898547,-2.481047553,1.1068068622,16.213245397,8.1422173972,5.9315179294,-5.404675044 +050,4,8,30,099,Montana,Teton County,6073,6071,6074,6060,6058,6053,6035,6064,6017,6100,6121,6150,6249,3,-14,-2,-5,-18,29,-47,83,21,29,99,16,72,75,79,80,77,81,86,76,76,73,24,65,61,73,59,67,70,67,52,69,70,-8,7,14,6,21,10,11,19,24,7,3,4,5,0,18,5,2,12,9,9,17,13,8,-26,-18,-29,-44,18,-71,56,-12,7,82,12,-21,-18,-11,-39,20,-59,65,-3,24,95,-1,0,2,0,0,-1,1,-1,0,-2,1,462,462,462,462,462,462,461,461,461,461,461,461,11.867479809,12.378280244,13.045991248,13.236267373,12.728324655,13.40948597,14.194932739,12.437607397,12.386928531,11.775143157,10.71369705,10.067667932,12.055156469,9.7617471873,11.075295479,11.588444665,11.058842948,8.5099419033,11.246027219,11.291233164,1.1537827592,2.3106123123,0.9908347783,3.4745201853,1.653029176,1.8210413045,3.1360897912,3.9276654938,1.140901312,0.4839099927,0.8241305423,0,2.9725043349,0.8272667108,0.3306058352,1.986590514,1.4855162169,1.4728745602,2.7707603292,2.0969433019,-4.28547882,-2.970787259,-4.789034762,-7.279947055,2.9754525167,-11.75399387,9.2432120162,-1.963832747,1.140901312,13.226873135,-3.461348278,-2.970787259,-1.816530427,-6.452680344,3.3060583519,-9.767403361,10.728728233,-0.490958187,3.9116616413,15.323816437 +050,4,8,30,101,Montana,Toole County,5324,5324,5343,5157,5218,5125,5121,5083,4962,4872,4830,4709,4686,19,-186,61,-93,-4,-38,-121,-90,-42,-121,-23,16,66,55,40,60,58,61,50,69,57,55,5,57,45,41,54,48,55,46,57,52,50,11,9,10,-1,6,10,6,4,12,5,5,0,-2,-1,3,-1,-2,1,0,0,1,0,8,-194,50,-99,-8,-45,-128,-96,-54,-126,-28,8,-196,49,-96,-9,-47,-127,-96,-54,-125,-28,0,1,2,4,-1,-1,0,2,0,-1,0,766,766,730,766,762,766,788,796,715,669,668,668,12.571428571,10.602409639,7.734699797,11.711887566,11.368090945,12.145345943,10.168802115,14.223871367,11.950938253,11.708355508,10.857142857,8.6746987952,7.9280672919,10.540698809,9.4080752646,10.950721752,9.3552979459,11.750154607,10.902610337,10.643959553,1.7142857143,1.9277108434,-0.193367495,1.1711887566,1.9600156801,1.1946241911,0.8135041692,2.4737167594,1.048327917,1.0643959553,-0.380952381,-0.192771084,0.5801024848,-0.195198126,-0.392003136,0.1991040319,0,0,0.2096655834,0,-36.95238095,9.6385542169,-19.143382,-1.561585009,-8.820070561,-25.48531608,-19.52410006,-11.13172542,-26.41786351,-5.96061735,-37.33333333,9.4457831325,-18.56327951,-1.756783135,-9.212073697,-25.28621205,-19.52410006,-11.13172542,-26.20819792,-5.96061735 +050,4,8,30,103,Montana,Treasure County,718,714,714,709,717,688,684,680,678,668,667,697,695,0,-5,8,-29,-4,-4,-2,-10,-1,30,-2,2,7,6,7,8,8,14,12,12,15,18,3,6,9,5,14,8,14,11,8,5,3,-1,1,-3,2,-6,0,0,1,4,10,15,0,0,0,0,0,0,0,0,0,0,0,1,-5,10,-31,1,-4,-2,-10,-5,20,-16,1,-5,10,-31,1,-4,-2,-10,-5,20,-16,0,-1,1,0,1,0,0,-1,0,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,9.8383696416,8.4151472651,9.9644128114,11.66180758,11.730205279,20.618556701,17.830609212,17.97752809,21.994134897,25.862068966,8.4328882642,12.622720898,7.1174377224,20.408163265,11.730205279,20.618556701,16.344725111,11.985018727,7.3313782991,4.3103448276,1.4054813774,-4.207573633,2.846975089,-8.746355685,0,0,1.485884101,5.9925093633,14.662756598,21.551724138,0,0,0,0,0,0,0,0,0,0,-7.027406887,14.025245442,-44.12811388,1.4577259475,-5.865102639,-2.9455081,-14.85884101,-7.490636704,29.325513196,-22.98850575,-7.027406887,14.025245442,-44.12811388,1.4577259475,-5.865102639,-2.9455081,-14.85884101,-7.490636704,29.325513196,-22.98850575 +050,4,8,30,105,Montana,Valley County,7369,7369,7378,7463,7506,7636,7636,7630,7548,7413,7409,7390,7359,9,85,43,130,0,-6,-82,-135,-4,-19,-31,18,82,69,101,83,83,96,85,98,77,88,11,89,73,101,95,77,81,92,91,66,62,7,-7,-4,0,-12,6,15,-7,7,11,26,1,4,0,16,6,4,4,3,3,5,3,3,88,48,112,7,-16,-101,-133,-13,-34,-60,4,92,48,128,13,-12,-97,-130,-10,-29,-57,-2,0,-1,2,-1,0,0,2,-1,-1,0,126,126,126,126,126,126,126,126,126,126,126,126,11.050468297,9.2190527089,13.340377757,10.869565217,10.873837285,12.649887996,11.362876813,13.223586561,10.406108521,11.933012408,11.993800957,9.7534905471,13.340377757,12.441068622,10.087776759,10.673342996,12.298643139,12.279044663,8.9195215893,8.4073496508,-0.94333266,-0.534437838,0,-1.571503405,0.7860605267,1.9765449993,-0.935766326,0.9445418972,1.4865869315,3.5256627568,0.539047234,0,2.1133271695,0.7857517025,0.5240403511,0.5270786665,0.401042711,0.4048036702,0.6757213325,0.4068072412,11.859039148,6.4132540584,14.793290186,0.9167103195,-2.096161404,-13.30873633,-17.77956019,-1.754149238,-4.594905061,-8.136144823,12.398086382,6.4132540584,16.906617356,1.702462022,-1.572121053,-12.78165766,-17.37851748,-1.349345567,-3.919183729,-7.729337582 +050,4,8,30,107,Montana,Wheatland County,2168,2168,2156,2131,2089,2121,2089,2110,2123,2143,2163,2102,2157,-12,-25,-42,32,-32,21,13,20,20,-61,55,4,23,25,21,25,24,20,30,30,26,22,9,19,29,18,25,21,25,29,36,21,23,-5,4,-4,3,0,3,-5,1,-6,5,-1,0,0,0,0,9,20,0,0,0,0,0,-7,-30,-40,29,-43,0,18,20,26,-66,57,-7,-30,-40,29,-34,20,18,20,26,-66,57,0,1,2,0,2,-2,0,-1,0,0,-1,147,147,147,147,147,147,147,147,147,147,147,147,10.730114299,11.848341232,9.9762470309,11.876484561,11.431293165,9.4495629577,14.064697609,13.934045518,12.192262603,10.33106363,8.8640074644,13.744075829,8.5510688836,11.876484561,10.002381519,11.811953697,13.595874355,16.720854621,9.8475967175,10.800657431,1.8661068346,-1.895734597,1.4251781473,0,1.4289116456,-2.362390739,0.4688232536,-2.786809104,2.3446658851,-0.469593801,0,0,0,4.2755344418,9.5260776375,0,0,0,0,0,-13.99580126,-18.95734597,13.77672209,-20.42755344,0,8.5046066619,9.3764650727,12.076172782,-30.94958968,26.766846678,-13.99580126,-18.95734597,13.77672209,-16.152019,9.5260776375,8.5046066619,9.3764650727,12.076172782,-30.94958968,26.766846678 +050,4,8,30,109,Montana,Wibaux County,1017,1017,1008,982,1034,1101,1084,1071,1043,1019,1029,954,939,-9,-26,52,67,-17,-13,-28,-24,10,-75,-15,0,8,7,14,14,17,13,11,12,6,6,1,19,16,11,13,22,21,11,15,12,7,-1,-11,-9,3,1,-5,-8,0,-3,-6,-1,0,0,0,0,0,0,0,0,0,-1,0,-8,-16,60,63,-19,-9,-21,-23,13,-68,-13,-8,-16,60,63,-19,-9,-21,-23,13,-69,-13,0,1,1,1,1,1,1,-1,0,0,-1,24,24,24,24,24,24,24,24,24,24,24,24,8.040201005,6.9444444444,13.114754098,12.814645309,15.777262181,12.298959319,10.669253152,11.71875,6.0514372163,6.3391442155,19.095477387,15.873015873,10.304449649,11.899313501,20.417633411,19.867549669,10.669253152,14.6484375,12.102874433,7.3956682515,-11.05527638,-8.928571429,2.8103044496,0.9153318078,-4.64037123,-7.56859035,0,-2.9296875,-6.051437216,-1.056524036,0,0,0,0,0,0,0,0,-1.008572869,0,-16.08040201,59.523809524,59.016393443,-17.39130435,-8.352668213,-19.86754967,-22.30843841,12.6953125,-68.58295512,-13.73481247,-16.08040201,59.523809524,59.016393443,-17.39130435,-8.352668213,-19.86754967,-22.30843841,12.6953125,-69.59152799,-13.73481247 +050,4,8,30,111,Montana,Yellowstone County,147972,147994,148405,149805,151690,153857,155379,156658,158066,159425,160118,161349,162990,411,1400,1885,2167,1522,1279,1408,1359,693,1231,1641,493,1983,2013,1977,1975,2066,2005,1918,1810,1825,1790,350,1364,1334,1463,1348,1436,1534,1487,1578,1603,1609,143,619,679,514,627,630,471,431,232,222,181,29,37,18,141,41,53,109,117,69,176,141,233,747,1181,1493,864,607,834,818,395,831,1319,262,784,1199,1634,905,660,943,935,464,1007,1460,6,-3,7,19,-10,-11,-6,-7,-3,2,0,3695,3695,3697,3698,3696,3695,3703,3714,3715,3694,3694,3696,13.299352805,13.353455281,12.940725977,12.773415773,13.242019376,12.741322556,12.082232252,11.328678769,11.354198098,11.037833871,9.1479158982,8.8492346473,9.5762681355,8.7182604871,9.2040367008,9.7482238406,9.3671946606,9.8766050266,9.9730298911,9.9217177089,4.1514369069,4.5042206338,3.3644578412,4.0551552859,4.0379826751,2.9930987151,2.7150375916,1.4520737428,1.381168207,1.1161161624,0.2481472788,0.1194049653,0.9229349331,0.2651696439,0.3397033044,0.6926704033,0.7370287662,0.4318667597,1.0949802001,0.8694606569,5.0098923577,7.8342924427,9.7726372702,5.5879651787,3.89056426,5.2998818012,5.152901972,2.4722807259,5.1700485586,8.133465294,5.2580396365,7.9536974079,10.695572203,5.8531348226,4.2302675644,5.9925522045,5.8899307382,2.9041474856,6.2650287588,9.0029259509 +040,2,4,31,000,Nebraska,Nebraska,1826341,1826311,1829591,1840914,1853691,1865813,1879955,1892059,1906483,1916998,1925512,1932571,1937552,3280,11323,12777,12122,14142,12104,14424,10515,8514,7059,4981,6500,25717,25787,26014,26448,26844,26547,26263,25600,25318,25061,3655,15615,15224,16175,15684,16556,16139,16880,16947,15819,16824,2845,10102,10563,9839,10764,10288,10408,9383,8653,9499,8237,714,2255,3319,3241,5133,4195,6024,4822,3478,2220,1837,-251,-1009,-1009,-879,-1672,-2277,-1958,-3634,-3593,-4643,-5123,463,1246,2310,2362,3461,1918,4066,1188,-115,-2423,-3286,-28,-25,-96,-79,-83,-102,-50,-56,-24,-17,30,51165,50807,51239,51359,51116,52144,52370,52553,51665,51030,50754,50039,14.012785707,13.959273048,13.987886557,14.121536625,14.233245158,13.977468197,13.737743172,13.324623749,13.124652839,12.951009567,8.508366015,8.2412057581,8.697396212,8.374250621,8.7783343328,8.4974708717,8.8296502585,8.8207968229,8.2004456617,8.694297313,5.5044196916,5.71806729,5.2904903449,5.7472860038,5.4549108248,5.4799973253,4.9080929132,4.5038269256,4.9242071775,4.2567122544,1.2287137601,1.7966737987,1.742705479,2.7406929634,2.2242759438,3.1717432636,2.5223088594,1.8102750546,1.1508306068,0.9493238329,-0.549788108,-0.546201827,-0.472643664,-0.892740821,-1.207312592,-1.030921864,-1.900885607,-1.870131763,-2.406894823,-2.647461076,0.6789256519,1.250471972,1.2700618147,1.8479521423,1.0169633517,2.1408213994,0.6214232528,-0.059856708,-1.256064216,-1.698137243 +050,2,4,31,001,Nebraska,Adams County,31364,31367,31328,31207,31351,31536,31400,31576,31723,31837,31513,31309,31321,-39,-121,144,185,-136,176,147,114,-324,-204,12,102,398,401,411,412,406,429,388,413,387,391,104,292,289,275,304,332,331,307,336,308,330,-2,106,112,136,108,74,98,81,77,79,61,1,-2,0,2,43,43,90,107,75,65,54,-38,-225,39,52,-291,63,-39,-73,-478,-349,-102,-37,-227,39,54,-248,106,51,34,-403,-284,-48,0,0,-7,-5,4,-4,-2,-1,2,1,-1,1554,1554,1577,1550,1440,1472,1484,1454,1451,1294,1230,1261,12.728871832,12.820102944,13.071063972,13.092665565,12.893800813,13.554716504,12.208936438,13.038674033,12.320524657,12.48602906,9.3387702886,9.2394258128,8.7458457233,9.6606076014,10.543699187,10.458301079,9.6601636249,10.607734807,9.8054821559,10.538080792,3.3901015431,3.5806771316,4.3252182486,3.4320579636,2.350101626,3.0964154252,2.5487728131,2.4309392265,2.515042501,1.9479482676,-0.06396418,0,0.0636061507,1.3664675226,1.3655995935,2.8436468191,3.3668974198,2.3677979479,2.0693387667,1.7244132205,-7.195970257,1.2468429298,1.6537599186,-9.247489513,2.0007621951,-1.232246955,-2.297042165,-15.09076559,-11.11075738,-3.257224972,-7.259934437,1.2468429298,1.7173660693,-7.881021991,3.3663617886,1.6113998641,1.0698552549,-12.72296764,-9.041418611,-1.532811752 +050,2,4,31,003,Nebraska,Antelope County,6685,6685,6679,6621,6551,6473,6421,6416,6347,6343,6305,6317,6264,-6,-58,-70,-78,-52,-5,-69,-4,-38,12,-53,30,74,74,85,93,78,84,88,79,84,82,9,80,69,84,66,75,86,89,71,50,54,21,-6,5,1,27,3,-2,-1,8,34,28,0,1,2,4,1,4,4,8,2,6,3,-29,-52,-79,-85,-81,-10,-71,-9,-50,-27,-83,-29,-51,-77,-81,-80,-6,-67,-1,-48,-21,-80,2,-1,2,2,1,-2,0,-2,2,-1,-1,70,70,70,73,72,67,70,61,60,55,54,53,11.127819549,11.235955056,13.052825553,14.4253141,12.15237205,13.16304944,13.869188337,12.492093612,13.310093488,13.035529767,12.030075188,10.476768904,12.899262899,10.237319684,11.684973125,13.476455379,14.02679275,11.227071474,7.922674695,8.5843732613,-0.902255639,0.7591861524,0.1535626536,4.187994416,0.467398925,-0.313405939,-0.157604413,1.2650221379,5.3874187926,4.4511565058,0.1503759398,0.303674461,0.6142506143,0.1551109043,0.6231985666,0.6268118781,1.2608353034,0.3162555345,0.9507209634,0.4769096256,-7.819548872,-11.99514121,-13.05282555,-12.56398325,-1.557996417,-11.12591084,-1.418439716,-7.906388362,-4.278244335,-13.19449964,-7.669172932,-11.69146675,-12.43857494,-12.40887234,-0.93479785,-10.49909896,-0.157604413,-7.590132827,-3.327523372,-12.71759002 +050,2,4,31,005,Nebraska,Arthur County,460,460,465,468,479,454,451,451,467,456,463,468,466,5,3,11,-25,-3,0,16,-11,7,5,-2,2,6,5,4,3,3,4,5,2,5,6,0,4,2,6,5,6,6,3,4,3,1,2,2,3,-2,-2,-3,-2,2,-2,2,5,0,0,0,0,0,0,1,0,0,0,0,3,1,9,-23,0,2,15,-11,8,5,-8,3,1,9,-23,0,2,16,-11,8,5,-8,0,0,-1,0,-1,1,2,-2,1,-2,1,0,0,0,0,0,0,0,0,0,0,0,0,12.861736334,10.559662091,8.5744908896,6.6298342541,6.6518847007,8.7145969499,10.834236186,4.3525571273,10.741138561,12.847965739,8.5744908896,4.2238648363,12.861736334,11.049723757,13.303769401,13.071895425,6.5005417118,8.7051142546,6.4446831364,2.1413276231,4.2872454448,6.3357972545,-4.287245445,-4.419889503,-6.651884701,-4.357298475,4.3336944745,-4.352557127,4.2964554243,10.706638116,0,0,0,0,0,2.1786492375,0,0,0,0,2.1436227224,19.007391763,-49.30332262,0,4.4345898004,32.679738562,-23.83531961,17.410228509,10.741138561,-17.13062099,2.1436227224,19.007391763,-49.30332262,0,4.4345898004,34.8583878,-23.83531961,17.410228509,10.741138561,-17.13062099 +050,2,4,31,007,Nebraska,Banner County,690,694,695,659,688,682,673,715,722,732,728,757,786,1,-36,29,-6,-9,42,7,10,-4,29,29,1,4,8,4,6,4,11,6,9,7,9,1,6,2,0,10,6,3,6,2,1,1,0,-2,6,4,-4,-2,8,0,7,6,8,1,2,2,2,4,0,0,1,1,1,1,-1,-35,21,-13,-9,44,-2,8,-12,22,20,0,-33,23,-11,-5,44,-2,9,-11,23,21,1,-1,0,1,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5.9084194978,11.878247958,5.8394160584,8.8560885609,5.7636887608,15.30967293,8.2530949106,12.328767123,9.4276094276,11.66558652,8.8626292467,2.9695619896,0,14.760147601,8.6455331412,4.1753653445,8.2530949106,2.7397260274,1.3468013468,1.29617628,-2.954209749,8.9086859688,5.8394160584,-5.904059041,-2.88184438,11.134307585,0,9.5890410959,8.0808080808,10.36941024,2.9542097489,2.9695619896,2.9197080292,5.9040590406,0,0,1.3755158184,1.3698630137,1.3468013468,1.29617628,-51.69867061,31.180400891,-18.97810219,-13.28413284,63.400576369,-2.783576896,11.004126547,-16.43835616,29.62962963,25.923525599,-48.74446086,34.14996288,-16.05839416,-7.380073801,63.400576369,-2.783576896,12.379642366,-15.06849315,30.976430976,27.219701879 +050,2,4,31,009,Nebraska,Blaine County,478,478,478,475,498,469,489,476,468,479,475,455,457,0,-3,23,-29,20,-13,-8,11,-4,-20,2,0,8,5,4,3,6,9,5,7,6,6,0,3,8,7,2,5,2,3,2,6,9,0,5,-3,-3,1,1,7,2,5,0,-3,0,0,0,0,0,0,0,0,0,0,0,0,-8,24,-26,19,-15,-14,10,-10,-19,4,0,-8,24,-26,19,-15,-14,10,-10,-19,4,0,0,2,0,0,1,-1,-1,1,-1,1,0,0,0,0,0,0,0,0,0,0,0,0,16.789087093,10.277492292,8.2730093071,6.2630480167,12.435233161,19.06779661,10.559662091,14.675052411,12.903225806,13.157894737,6.29590766,16.443987667,14.477766287,4.1753653445,10.362694301,4.2372881356,6.3357972545,4.1928721174,12.903225806,19.736842105,10.493179433,-6.166495375,-6.20475698,2.0876826722,2.0725388601,14.830508475,4.2238648363,10.482180294,0,-6.578947368,0,0,0,0,0,0,0,0,0,0,-16.78908709,49.331963001,-53.7745605,39.665970772,-31.0880829,-29.66101695,21.119324182,-20.96436059,-40.86021505,8.7719298246,-16.78908709,49.331963001,-53.7745605,39.665970772,-31.0880829,-29.66101695,21.119324182,-20.96436059,-40.86021505,8.7719298246 +050,2,4,31,011,Nebraska,Boone County,5505,5505,5511,5406,5428,5396,5355,5308,5341,5317,5211,5176,5096,6,-105,22,-32,-41,-47,33,-24,-106,-35,-80,18,57,49,77,54,68,75,56,56,70,70,7,70,61,62,71,73,69,71,60,56,64,11,-13,-12,15,-17,-5,6,-15,-4,14,6,0,1,0,2,1,0,1,2,1,2,2,-6,-93,35,-49,-25,-43,26,-10,-103,-50,-86,-6,-92,35,-47,-24,-43,27,-8,-102,-48,-84,1,0,-1,0,0,1,0,-1,0,-1,-2,95,95,95,107,104,110,97,92,90,102,97,98,10.442429239,9.045597194,14.227642276,10.045577156,12.75438432,14.085829655,10.508538187,10.638297872,13.478386445,13.629283489,12.824035907,11.260845486,11.456023651,13.208073668,13.692206696,12.958963283,13.323325202,11.398176292,10.782709156,12.46105919,-2.381606668,-2.215248292,2.7716186253,-3.162496512,-0.937822376,1.1268663724,-2.814787014,-0.759878419,2.6956772889,1.1682242991,0.183200513,0,0.36954915,0.1860292066,0,0.1878110621,0.3753049353,0.1899696049,0.3850967556,0.3894080997,-17.03764771,6.4611408529,-9.053954176,-4.650730165,-8.065272437,4.8830876139,-1.876524676,-19.5668693,-9.627418889,-16.74454829,-16.85444719,6.4611408529,-8.684405026,-4.464700958,-8.065272437,5.0708986759,-1.501219741,-19.3768997,-9.242322133,-16.35514019 +050,2,4,31,013,Nebraska,Box Butte County,11308,11308,11277,11298,11270,11302,11303,11327,11168,10842,10735,10786,10696,-31,21,-28,32,1,24,-159,-326,-107,51,-90,26,140,135,179,149,181,149,142,138,125,129,18,119,126,123,114,109,129,111,133,103,109,8,21,9,56,35,72,20,31,5,22,20,1,-2,3,7,6,6,10,9,8,4,4,-44,1,-38,-32,-39,-53,-189,-368,-120,25,-112,-43,-1,-35,-25,-33,-47,-179,-359,-112,29,-108,4,1,-2,1,-1,-1,0,2,0,0,-2,186,186,186,183,191,186,186,177,178,138,143,126,12.403100775,11.963842609,15.860357966,13.182924132,15.99646487,13.247388309,12.903225806,12.791398248,11.616560569,12.01005493,10.542635659,11.166253102,10.898458267,10.086264101,9.6332302254,11.469215381,10.086324398,12.32794179,9.5720459086,10.14803091,1.8604651163,0.7975895073,4.9618996987,3.096660031,6.3632346443,1.7781729273,2.8169014085,0.4634564583,2.0445146601,1.8620240201,-0.177187154,0.2658631691,0.6202374623,0.5308560053,0.5302695537,0.8890864637,0.8178100863,0.7415303332,0.3717299382,0.372404804,0.088593577,-3.367600142,-2.835371256,-3.450564035,-4.684047724,-16.80373416,-33.43934575,-11.122955,2.3233121137,-10.42733451,-0.088593577,-3.101736973,-2.215133794,-2.919708029,-4.153778171,-15.9146477,-32.62153567,-10.38142467,2.6950420519,-10.05492971 +050,2,4,31,015,Nebraska,Boyd County,2099,2099,2106,2080,2061,2017,2020,2004,1980,1956,1946,1894,1860,7,-26,-19,-44,3,-16,-24,-24,-10,-52,-34,5,21,24,15,13,16,21,13,22,9,12,6,21,34,35,31,36,34,41,27,28,28,-1,0,-10,-20,-18,-20,-13,-28,-5,-19,-16,0,0,1,1,0,2,2,2,0,-1,1,9,-27,-8,-26,22,1,-12,1,-5,-30,-19,9,-27,-7,-25,22,3,-10,3,-5,-31,-18,-1,1,-2,1,-1,1,-1,1,0,-2,0,27,27,27,29,26,30,29,31,28,34,32,28,10.033444816,11.591403043,7.3565473271,6.440426059,7.9522862823,10.542168675,6.6056910569,11.27626858,4.6875,6.3931806074,10.033444816,16.421154311,17.165277097,15.357939064,17.892644135,17.068273092,20.833333333,13.839056894,14.583333333,14.917421417,0,-4.829751268,-9.808729769,-8.917513005,-9.940357853,-6.526104418,-14.22764228,-2.562788314,-9.895833333,-8.52424081,0,0.4829751268,0.4904364885,0,0.9940357853,1.0040160643,1.0162601626,0,-0.520833333,0.5327650506,-12.90014333,-3.863801014,-12.7513487,10.899182561,0.4970178926,-6.024096386,0.5081300813,-2.562788314,-15.625,-10.12253596,-12.90014333,-3.380825887,-12.26091221,10.899182561,1.4910536779,-5.020080321,1.5243902439,-2.562788314,-16.14583333,-9.589770911 +050,2,4,31,017,Nebraska,Brown County,3145,3143,3155,3099,3054,2960,2976,2985,2981,3006,2963,2966,2981,12,-56,-45,-94,16,9,-4,25,-43,3,15,11,29,28,27,28,25,28,30,28,31,33,10,47,35,50,38,46,30,40,45,23,33,1,-18,-7,-23,-10,-21,-2,-10,-17,8,0,0,0,0,0,0,0,1,3,2,3,3,12,-39,-39,-73,26,30,-3,34,-30,-6,12,12,-39,-39,-73,26,30,-2,37,-28,-3,15,-1,1,1,2,0,0,0,-2,2,-2,0,40,40,40,38,29,36,38,2,14,18,31,26,9.2740645987,9.1012514221,8.9790488859,9.4339622642,8.3878543868,9.3865236339,10.021713713,9.3818059977,10.457075392,11.098032621,15.030380556,11.376564278,16.627868307,12.803234501,15.433652072,10.056989608,13.362284951,15.077902496,7.7584752909,11.098032621,-5.756315958,-2.275312856,-7.648819421,-3.369272237,-7.045797685,-0.670465974,-3.340571238,-5.696096499,2.6986001012,0,0,0,0,0,0,0.3352329869,1.0021713713,0.6701289998,1.0119750379,1.0089120565,-12.47201791,-12.67674305,-24.27668773,8.7601078167,10.065425264,-1.005698961,11.357942208,-10.051935,-2.023950076,4.035648226,-12.47201791,-12.67674305,-24.27668773,8.7601078167,10.065425264,-0.670465974,12.360113579,-9.381805998,-1.011975038,5.0445602825 +050,2,4,31,019,Nebraska,Buffalo County,46102,46099,46176,46826,47642,48013,48220,48605,49171,49400,49461,49823,50114,77,650,816,371,207,385,566,229,61,362,291,162,665,680,690,739,722,739,682,646,611,609,66,359,299,344,358,368,340,357,378,363,413,96,306,381,346,381,354,399,325,268,248,196,19,96,121,118,150,63,79,75,51,34,26,-36,247,312,-88,-324,-28,91,-167,-260,79,66,-17,343,433,30,-174,35,170,-92,-209,113,92,-2,1,2,-5,0,-4,-3,-4,2,1,3,2225,2225,2263,2312,2222,2173,2084,2063,2045,1973,2138,2156,14.300767725,14.396409366,14.42684648,15.358556836,14.913503744,15.116183931,13.837741324,13.06885425,12.308126183,12.187678237,7.7202640803,6.3301858831,7.1925147666,7.4402751655,7.6013426285,6.9546719031,7.2435097544,7.6471004744,7.3123564723,8.2652070805,6.5805036451,8.0662234831,7.2343317129,7.9182816705,7.3121611154,8.1615120275,6.5942315691,5.4217537755,4.9957697111,3.9224711568,2.0644717318,2.5617140196,2.4671998327,3.1174337286,1.3013168087,1.6159384716,1.5217457467,1.0317516513,0.684903912,0.5203278065,5.3117137266,6.6054113562,-1.839945638,-6.733656854,-0.578363026,1.86139748,-3.388420529,-5.259910379,1.5913943838,1.3208321242,7.3761854584,9.1671253758,0.6272541948,-3.616223125,0.7229537826,3.4773359516,-1.866674783,-4.228158728,2.2762982958,1.8411599308 +050,2,4,31,021,Nebraska,Burt County,6858,6858,6841,6782,6683,6572,6548,6540,6526,6529,6482,6494,6477,-17,-59,-99,-111,-24,-8,-14,3,-47,12,-17,23,59,88,59,68,76,58,79,56,73,63,31,105,90,100,100,92,103,84,104,78,100,-8,-46,-2,-41,-32,-16,-45,-5,-48,-5,-37,0,1,1,1,1,1,0,0,0,0,0,-9,-14,-101,-73,7,8,31,9,3,16,21,-9,-13,-100,-72,8,9,31,9,3,16,21,0,0,3,2,0,-1,0,-1,-2,1,-1,122,122,122,128,128,130,132,126,121,120,124,127,8.6618219188,13.070924619,8.9023010185,10.365853659,11.613691932,8.8780039798,12.102642666,8.6081008378,11.251541307,9.7139773341,15.415106805,13.367991088,15.088645794,15.243902439,14.058679707,15.766110516,12.868632708,15.986472984,12.022194821,15.419011641,-6.753284886,-0.297066469,-6.186344776,-4.87804878,-2.444987775,-6.888106536,-0.765990042,-7.378372147,-0.770653514,-5.705034307,0.146810541,0.1485332343,0.1508864579,0.1524390244,0.1528117359,0,0,0,0,0,-2.055347574,-15.00185667,-11.01471143,1.0670731707,1.2224938875,4.7451400582,1.3787820758,0.4611482592,2.4660912454,3.2379924447,-1.908537033,-14.85332343,-10.86382497,1.2195121951,1.3753056235,4.7451400582,1.3787820758,0.4611482592,2.4660912454,3.2379924447 +050,2,4,31,023,Nebraska,Butler County,8395,8395,8374,8255,8250,8228,8175,8053,7985,8028,8022,7990,7960,-21,-119,-5,-22,-53,-122,-68,43,-6,-32,-30,19,91,98,84,104,84,77,87,88,106,100,39,96,98,101,94,106,110,98,115,102,99,-20,-5,0,-17,10,-22,-33,-11,-27,4,1,0,1,1,2,3,1,2,1,1,1,1,-1,-114,-5,-8,-67,-102,-37,54,21,-36,-31,-1,-113,-4,-6,-64,-101,-35,55,22,-35,-30,0,-1,-1,1,1,1,0,-1,-1,-1,-1,173,173,173,166,173,174,166,166,160,166,168,166,10.944735101,11.875189337,10.195412065,12.680607206,10.3524772,9.6021947874,10.866171236,10.965732087,13.240069948,12.539184953,11.546094173,11.875189337,12.258769268,11.461318052,13.063840276,13.717421125,12.240054955,14.330218069,12.740444667,12.413793103,-0.601359072,0,-2.063357204,1.2192891544,-2.711363076,-4.115226337,-1.373883719,-3.364485981,0.499625281,0.1253918495,0.1202718143,0.1211754014,0.2427479063,0.3657867463,0.1232437762,0.2494076568,0.12489852,0.1246105919,0.1249063203,0.1253918495,-13.71098683,-0.605877007,-0.970991625,-8.169237335,-12.57086517,-4.614041651,6.7445200774,2.6168224299,-4.496627529,-3.887147335,-13.59071502,-0.484701606,-0.728243719,-7.803450588,-12.4476214,-4.364633994,6.8694185974,2.7414330218,-4.371721209,-3.761755486 +050,2,4,31,025,Nebraska,Cass County,25241,25241,25239,25237,25125,25292,25401,25419,25629,25927,26137,26186,26232,-2,-2,-112,167,109,18,210,298,210,49,46,71,313,259,283,294,300,261,267,262,263,251,94,224,217,220,248,259,230,234,240,219,243,-23,89,42,63,46,41,31,33,22,44,8,2,8,4,0,5,4,8,11,5,9,7,21,-99,-162,107,63,-25,172,256,185,-4,31,23,-91,-158,107,68,-21,180,267,190,5,38,-2,0,4,-3,-5,-2,-1,-2,-2,0,0,297,297,297,298,282,298,298,295,277,257,253,253,12.401933592,10.285532743,11.226372057,11.599234608,11.806375443,10.225669958,10.35766933,10.064535956,10.05294039,9.5768629097,8.8755051906,8.6176085144,8.7272150267,9.7843883771,10.192837466,9.0111267826,9.0775079525,9.2194222495,8.3710796399,9.2716242512,3.5264284016,1.6679242286,2.4991570304,1.8148462312,1.6135379772,1.2145431751,1.2801613779,0.8451137062,1.6818607496,0.3052386585,0.3169823282,0.1588499265,0,0.1972658947,0.1574183392,0.3134304968,0.4267204593,0.1920712969,0.3440169715,0.2670838262,-3.922656312,-6.433422025,4.2446000357,2.4855502732,-0.98386462,6.7387556809,9.9309488711,7.106637984,-0.152896432,1.1827998016,-3.605673984,-6.274572098,4.2446000357,2.6828161679,-0.826446281,7.0521861777,10.35766933,7.2987092809,0.1911205397,1.4498836278 +050,2,4,31,027,Nebraska,Cedar County,8852,8852,8819,8751,8699,8628,8546,8523,8600,8523,8459,8420,8414,-33,-68,-52,-71,-82,-23,77,-77,-64,-39,-6,25,98,109,92,103,131,96,111,105,112,112,36,98,106,92,87,120,97,107,97,102,101,-11,0,3,0,16,11,-1,4,8,10,11,0,0,0,0,0,2,4,2,2,1,1,-22,-69,-55,-72,-99,-38,74,-82,-74,-52,-16,-22,-69,-55,-72,-99,-36,78,-80,-72,-51,-15,0,1,0,1,1,2,0,-1,0,2,-2,144,144,144,143,154,145,148,145,135,128,136,137,11.155378486,12.492836676,10.619264731,11.994875975,15.34946394,11.212988378,12.965017812,12.366034625,13.270928373,13.306403707,11.155378486,12.148997135,10.619264731,10.13159427,14.060577655,11.32979034,12.497809963,11.423860558,12.086024054,11.999524771,0,0.3438395415,0,1.8632817049,1.2888862851,-0.116801962,0.4672078491,0.9421740667,1.184904319,1.3068789355,0,0,0,0,0.2343429609,0.4672078491,0.2336039245,0.2355435167,0.1184904319,0.118807176,-7.854297097,-6.303724928,-8.31072892,-11.52905555,-4.452516258,8.6433452082,-9.577760906,-8.715110117,-6.161502459,-1.900914815,-7.854297097,-6.303724928,-8.31072892,-11.52905555,-4.218173297,9.1105530573,-9.344156982,-8.4795666,-6.043012027,-1.782107639 +050,2,4,31,029,Nebraska,Chase County,3966,3966,3966,3986,4019,3984,3984,3966,3910,3922,3904,3901,3840,0,20,33,-35,0,-18,-56,12,-18,-3,-61,13,54,43,46,37,49,47,57,46,50,49,20,55,42,45,54,61,48,53,55,44,56,-7,-1,1,1,-17,-12,-1,4,-9,6,-7,0,-3,-1,18,1,8,10,15,3,10,8,8,24,33,-54,18,-15,-64,-7,-11,-18,-63,8,21,32,-36,19,-7,-54,8,-8,-8,-55,-1,0,0,0,-2,1,-1,0,-1,-1,1,66,66,66,68,70,70,66,67,72,64,65,69,13.581488934,10.743285447,11.495689117,9.2871485944,12.327044025,11.934992382,14.55566905,11.755686174,12.812299808,12.659863067,13.832997988,10.493441599,11.245782831,13.554216867,15.34591195,12.18892839,13.53421859,14.05571173,11.274823831,14.468414933,-0.251509054,0.2498438476,0.2499062851,-4.267068273,-3.018867925,-0.253936008,1.0214504597,-2.300025556,1.5374759769,-1.808551867,-0.754527163,-0.249843848,4.4983131326,0.2510040161,2.0125786164,2.5393600813,3.8304392237,0.7666751853,2.5624599616,2.0669164191,6.0362173038,8.2448469706,-13.4949394,4.5180722892,-3.773584906,-16.25190452,-1.787538304,-2.811142346,-4.612427931,-16.2769668,5.2816901408,7.995003123,-8.996626265,4.7690763052,-1.761006289,-13.71254444,2.0429009193,-2.044467161,-2.049967969,-14.21005038 +050,2,4,31,031,Nebraska,Cherry County,5713,5713,5694,5732,5735,5759,5749,5831,5847,5818,5801,5757,5781,-19,38,3,24,-10,82,16,-29,-17,-44,24,7,72,66,71,68,91,75,72,81,78,76,24,56,62,57,53,73,60,77,65,52,57,-17,16,4,14,15,18,15,-5,16,26,19,0,0,-2,-1,1,0,10,8,7,6,5,-2,23,-1,13,-26,64,-10,-31,-40,-74,0,-2,23,-3,12,-25,64,0,-23,-33,-68,5,0,-1,2,-2,0,0,1,-1,0,-2,0,57,57,57,61,57,56,55,45,44,40,40,38,12.602835638,11.511293276,12.354271794,11.817865832,15.716753022,12.844665182,12.34462066,13.942680093,13.497144835,13.173860288,9.8022054962,10.813639138,9.9182182008,9.2109836635,12.607944732,10.275732146,13.201885984,11.188570445,8.9980965565,9.8803952158,2.8006301418,0.697654138,2.4360535932,2.6068821689,3.1088082902,2.5689330365,-0.857265324,2.754109648,4.4990482782,3.2934650719,0,-0.348827069,-0.174003828,0.1737921446,0,1.7126220243,1.3716245178,1.204922971,1.0382419104,0.8667013347,4.0259058288,-0.174413534,2.2620497651,-4.518595759,11.053540587,-1.712622024,-5.315045006,-6.88527412,-12.80498356,0,4.0259058288,-0.523240603,2.088045937,-4.344803615,11.053540587,0,-3.943420489,-5.680351149,-11.76674165,0.8667013347 +050,2,4,31,033,Nebraska,Cheyenne County,9998,9998,9969,9993,10076,10075,10124,10150,10069,9654,9295,9011,9111,-29,24,83,-1,49,26,-81,-415,-359,-284,100,33,133,120,127,134,117,129,118,110,109,106,37,87,91,90,107,90,99,105,105,83,85,-4,46,29,37,27,27,30,13,5,26,21,2,3,-1,-1,-3,-2,8,5,3,1,2,-28,-26,56,-37,24,1,-119,-436,-369,-310,78,-26,-23,55,-38,21,-1,-111,-431,-366,-309,80,1,1,-1,0,1,0,0,3,2,-1,-1,102,102,102,106,101,101,103,94,80,81,88,70,13.325318104,11.958742339,12.604833507,13.267983564,11.541876295,12.760274989,11.965725295,11.610111352,11.908663826,11.698488026,8.7165614668,9.0687129404,8.9325591782,10.59458389,8.8783663806,9.7927691775,10.647467424,11.082379017,9.0680651153,9.3808630394,4.6087566376,2.8900293986,3.6722743288,2.6733996733,2.6635099142,2.9675058114,1.3182578715,0.5277323342,2.8405987108,2.3176249862,0.3005710851,-0.099656186,-0.099250658,-0.297044408,-0.197297031,0.791334883,0.5070222583,0.3166394005,0.1092537966,0.2207261892,-2.604949404,5.5807464248,-3.672274329,2.3763552651,0.0986485153,-11.77110639,-44.21234092,-38.94664626,-33.86867694,8.6083213773,-2.304378319,5.4810902387,-3.771524986,2.079310857,-0.098648515,-10.9797715,-43.70531866,-38.63000686,-33.75942314,8.8290475665 +050,2,4,31,035,Nebraska,Clay County,6542,6539,6537,6455,6385,6360,6316,6289,6134,6190,6208,6219,6216,-2,-82,-70,-25,-44,-27,-155,56,18,11,-3,21,78,67,76,73,91,83,81,80,75,76,25,83,69,67,66,80,71,66,68,61,73,-4,-5,-2,9,7,11,12,15,12,14,3,0,0,0,0,0,0,1,2,2,1,1,3,-77,-71,-32,-53,-36,-169,38,5,-4,-6,3,-77,-71,-32,-53,-36,-168,40,7,-3,-5,-1,0,3,-2,2,-2,1,1,-1,0,-1,96,96,96,98,87,90,90,69,72,74,70,72,12.007389163,10.436137072,11.926245587,11.517828968,14.438714796,13.362311841,13.145082765,12.905307308,12.070491671,12.223562525,12.777093596,10.747663551,10.51392703,10.413379615,12.693375645,11.430411334,10.710808179,10.969511211,9.817333226,11.741053478,-0.769704433,-0.31152648,1.4123185563,1.1044493531,1.7453391511,1.9319005071,2.4342745862,1.9357960961,2.2531584453,0.482509047,0,0,0,0,0,0.1609917089,0.3245699448,0.3226326827,0.160939889,0.160836349,-11.85344828,-11.05919003,-5.021577089,-8.362259388,-5.71201904,-27.20759881,6.1668289516,0.8065817067,-0.643759556,-0.965018094,-11.85344828,-11.05919003,-5.021577089,-8.362259388,-5.71201904,-27.0466071,6.4913988965,1.1292143894,-0.482819667,-0.804181745 +050,2,4,31,037,Nebraska,Colfax County,10515,10515,10541,10563,10550,10451,10662,10713,10726,10700,10714,10677,10587,26,22,-13,-99,211,51,13,-26,14,-37,-90,43,181,168,164,184,189,211,196,201,191,190,7,80,86,100,86,82,84,69,70,67,74,36,101,82,64,98,107,127,127,131,124,116,1,7,29,79,108,120,186,163,103,104,84,-10,-86,-128,-248,7,-179,-300,-318,-219,-266,-288,-9,-79,-99,-169,115,-59,-114,-155,-116,-162,-204,-1,0,4,6,-2,3,0,2,-1,1,-2,108,108,108,109,94,93,94,80,79,77,76,51,17.153146323,15.914365557,15.61830389,17.430019419,17.684210526,19.683753906,18.295528797,18.772765481,17.857977654,17.870579383,7.5815011372,8.1466395112,9.5233560307,8.1466395112,7.6725146199,7.8361863893,6.4407728927,6.5377790231,6.2643167687,6.9601203913,9.5716451857,7.7677260456,6.0949478596,9.2833799081,10.011695906,11.847567517,11.854755904,12.234986457,11.593660885,10.910458992,0.6633813495,2.7471226259,7.5234512642,10.230663572,11.228070175,17.351555576,15.215159152,9.6198748482,9.7237155813,7.9006772009,-8.150113723,-12.1252309,-23.61792296,0.6630985649,-16.74853801,-27.98637996,-29.68356203,-20.45390866,-24.87027254,-27.08803612,-7.486732373,-9.378108275,-16.09447169,10.893762137,-5.520467836,-10.63482439,-14.46840288,-10.83403381,-15.14655696,-19.18735892 +050,2,4,31,039,Nebraska,Cuming County,9139,9139,9161,9117,9084,9011,9018,9074,8939,8940,8913,8818,8798,22,-44,-33,-73,7,56,-135,1,-27,-95,-20,32,101,115,106,112,129,96,111,111,119,116,13,111,96,116,98,96,85,98,90,100,110,19,-10,19,-10,14,33,11,13,21,19,6,5,0,14,18,6,-3,-1,-5,-6,-10,-2,-2,-32,-68,-83,-13,26,-145,-5,-42,-103,-25,3,-32,-54,-65,-7,23,-146,-10,-48,-113,-27,0,-2,2,2,0,0,0,-2,0,-1,1,130,130,130,139,131,135,132,131,132,125,107,93,11.051537367,12.636668315,11.715943631,12.424427312,14.260446606,10.658968523,12.416801835,12.434884893,13.422818792,13.169845595,12.145748988,10.548870941,12.821221332,10.871373898,10.612425381,9.4376283795,10.9625818,10.082339103,11.279679657,12.488646685,-1.094211621,2.0877973738,-1.105277701,1.5530534139,3.6480212249,1.2213401432,1.4542200347,2.3525457906,2.1431391348,0.6811989101,0,1.5383770123,1.9894998618,0.6655943203,-0.331638293,-0.111030922,-0.559315398,-0.67215594,-1.127967966,-0.227066303,-3.501477186,-7.472116917,-9.173804918,-1.442121027,2.8741985408,-16.09948371,-0.559315398,-4.705091581,-11.61807005,-2.838328792,-3.501477186,-5.933739904,-7.184305057,-0.776526707,2.5425602476,-16.21051463,-1.118630796,-5.377247521,-12.74603801,-3.065395095 +050,2,4,31,041,Nebraska,Custer County,10939,10939,10905,10905,10846,10830,10772,10831,10828,10873,10818,10796,10626,-34,0,-59,-16,-58,59,-3,45,-55,-22,-170,29,107,122,118,137,137,138,142,124,123,125,39,157,132,136,126,124,126,138,143,91,114,-10,-50,-10,-18,11,13,12,4,-19,32,11,0,-1,-2,-2,-4,-2,-1,-1,-2,-1,1,-24,53,-47,6,-66,48,-13,42,-33,-53,-180,-24,52,-49,4,-70,46,-14,41,-35,-54,-179,0,-2,0,-2,1,0,-1,0,-1,0,-2,128,128,128,128,127,126,126,127,133,132,132,117,9.8120128381,11.21787504,10.887617642,12.68401074,12.683423599,12.74297059,13.086954518,11.433313356,11.381511983,11.670245542,14.397065566,12.137372994,12.548440672,11.66558652,11.479887053,11.63488619,12.718307912,13.185192015,8.420468215,10.643263934,-4.585052728,-0.919497954,-1.66082303,1.01842422,1.2035365459,1.1080843991,0.3686466061,-1.751878659,2.9610437679,1.0269816077,-0.091701055,-0.183899591,-0.184535892,-0.37033608,-0.185159469,-0.092340367,-0.092161652,-0.18440828,-0.092532618,0.0933619643,4.8601558918,-4.321640384,0.5536076767,-6.11054532,4.4438272462,-1.200424766,3.8707893645,-3.042736619,-4.904228741,-16.80515358,4.7684548372,-4.505539975,0.3690717845,-6.4808814,4.2586677776,-1.292765132,3.778627713,-3.227144899,-4.996761358,-16.71179162 +050,2,4,31,043,Nebraska,Dakota County,21006,21006,21033,20810,20711,20761,20545,20548,20295,20075,20081,20100,20070,27,-223,-99,50,-216,3,-253,-220,6,19,-30,105,352,381,371,359,377,345,370,365,354,342,63,172,136,144,176,149,170,199,164,130,136,42,180,245,227,183,228,175,171,201,224,206,23,27,14,13,12,14,63,68,34,14,18,-41,-433,-365,-192,-423,-241,-492,-460,-230,-219,-254,-18,-406,-351,-179,-411,-227,-429,-392,-196,-205,-236,3,3,7,2,12,2,1,1,1,0,0,249,249,249,244,250,255,260,250,250,245,252,253,16.824797457,18.352159148,17.891589506,17.382462596,18.348623853,16.893959797,18.330443399,18.179101504,17.620268286,17.027632562,8.2212078484,6.5509019532,6.9444444444,8.5217643926,7.2518433797,8.3245599001,9.8588060441,8.1681442375,6.470719992,6.7712223052,8.6035896088,11.801257195,10.947145062,8.8606982037,11.096780474,8.5693998972,8.4716373545,10.010957267,11.149548294,10.256410256,1.2905384413,0.674357554,0.6269290123,0.5810293904,0.6813812571,3.084983963,3.3688382462,1.6933957565,0.6968467684,0.8961911875,-20.69641278,-17.5814648,-9.259259259,-20.48128601,-11.72949164,-24.09225571,-22.7891999,-11.45532424,-10.90067445,-12.64625342,-19.40587434,-16.90710725,-8.632330247,-19.90025662,-11.04811038,-21.00727175,-19.42036165,-9.761928479,-10.20382768,-11.75006224 +050,2,4,31,045,Nebraska,Dawes County,9182,9182,9170,9208,9144,9072,9030,8974,8922,8897,8688,8557,8361,-12,38,-64,-72,-42,-56,-52,-25,-209,-131,-196,22,101,110,98,102,88,94,93,67,81,78,22,83,81,97,77,72,98,96,89,74,86,0,18,29,1,25,16,-4,-3,-22,7,-8,3,13,13,13,11,14,16,11,13,1,2,-15,8,-108,-90,-79,-84,-66,-34,-201,-139,-190,-12,21,-95,-77,-68,-70,-50,-23,-188,-138,-188,0,-1,2,4,1,-2,2,1,1,0,0,1132,1132,1147,1166,1110,1130,1159,1150,1125,1005,987,978,10.991402764,11.987794246,10.759771629,11.269472986,9.775605421,10.505140814,10.438296201,7.6201307933,9.3940272543,9.2209481026,9.0325389052,8.8273757629,10.649978041,8.5073472544,7.9982226172,10.952168082,10.775015433,10.122263293,8.5821977385,10.16668637,1.958863859,3.160418483,0.1097935881,2.762125732,1.7773828038,-0.447027269,-0.336719232,-2.502132499,0.8118295158,-0.945738267,1.4147350093,1.41673932,1.4273166447,1.2153353221,1.5552099533,1.7881090747,1.234637185,1.4785328405,0.1159756451,0.2364345667,0.8706061595,-11.76983435,-9.881422925,-8.728317313,-9.33125972,-7.375949933,-3.816151299,-22.86039238,-16.12061467,-22.46128384,2.2853411688,-10.35309503,-8.45410628,-7.512981991,-7.776049767,-5.587840858,-2.581514114,-21.38185954,-16.00463903,-22.22484927 +050,2,4,31,047,Nebraska,Dawson County,24326,24316,24302,24204,23967,24003,23964,23870,23742,23640,23726,23571,23510,-14,-98,-237,36,-39,-94,-128,-102,86,-155,-61,90,342,396,388,391,423,391,410,416,404,396,72,192,214,247,201,208,196,210,214,194,217,18,150,182,141,190,215,195,200,202,210,179,15,26,44,58,100,106,183,167,134,101,84,-47,-275,-476,-164,-337,-419,-507,-470,-250,-467,-324,-32,-249,-432,-106,-237,-313,-324,-303,-116,-366,-240,0,1,13,1,8,4,1,1,0,1,0,299,299,299,300,295,299,298,296,292,295,295,296,14.101348287,16.441427415,16.176777152,16.302874893,17.686164653,16.424430816,17.306150015,17.565342229,17.083535954,16.822072598,7.9165464066,8.885013805,10.298102981,8.3807617737,8.6967429025,8.2332185163,8.8641256173,9.0360173964,8.2034801362,9.218155944,6.1848018802,7.5564136098,5.8786741714,7.9221131194,8.9894217502,8.1912122994,8.4420243975,8.5293248322,8.8800558175,7.6039166543,1.0720323259,1.8268252683,2.4181780279,4.1695332208,4.4319939792,7.6871376964,7.0490903719,5.6580669679,4.2708839884,3.5683184299,-11.33880345,-19.7629279,-6.837606838,-14.05132695,-17.5189196,-21.29715198,-19.83875733,-10.55609509,-19.7475527,-13.76351394,-10.26677112,-17.93610263,-4.41942881,-9.881793733,-13.08692562,-13.61001428,-12.78966696,-4.898028121,-15.47666871,-10.19519551 +050,2,4,31,049,Nebraska,Deuel County,1941,1932,1925,1957,1958,1919,1924,1908,1862,1858,1826,1816,1793,-7,32,1,-39,5,-16,-46,-4,-32,-10,-23,3,14,15,16,17,17,21,10,14,16,18,10,25,23,21,20,22,26,24,23,16,15,-7,-11,-8,-5,-3,-5,-5,-14,-9,0,3,0,0,0,1,0,1,1,1,0,0,1,0,44,8,-35,6,-10,-42,9,-24,-9,-28,0,44,8,-34,6,-9,-41,10,-24,-9,-27,0,-1,1,0,2,-2,0,0,1,-1,1,22,22,22,22,18,20,19,18,9,0,0,0,7.2127769191,7.662835249,8.253804488,8.8472547489,8.872651357,11.140583554,5.376344086,7.6004343105,8.7863811093,9.9750623441,12.879958784,11.749680715,10.833118391,10.408534999,11.482254697,13.793103448,12.903225806,12.486427796,8.7863811093,8.3125519534,-5.667181865,-4.086845466,-2.579313903,-1.56128025,-2.60960334,-2.652519894,-7.52688172,-4.885993485,0,1.6625103907,0,0,0.5158627805,0,0.5219206681,0.5305039788,0.5376344086,0,0,0.5541701302,22.66872746,4.0868454662,-18.05519732,3.1225604996,-5.219206681,-22.28116711,4.8387096774,-13.02931596,-4.942339374,-15.51676365,22.66872746,4.0868454662,-17.53933454,3.1225604996,-4.697286013,-21.75066313,5.376344086,-13.02931596,-4.942339374,-14.96259352 +050,2,4,31,051,Nebraska,Dixon County,6000,6003,5988,5996,5888,5813,5758,5769,5742,5744,5692,5636,5596,-15,8,-108,-75,-55,11,-27,2,-52,-56,-40,21,77,67,67,76,84,76,81,84,60,68,6,81,69,70,52,67,62,74,60,43,53,15,-4,-2,-3,24,17,14,7,24,17,15,0,0,1,8,3,6,6,10,4,9,9,-30,11,-109,-81,-84,-12,-48,-15,-79,-82,-63,-30,11,-108,-73,-81,-6,-42,-5,-75,-73,-54,0,1,2,1,2,0,1,0,-1,0,-1,81,81,81,79,79,80,82,79,74,69,76,74,12.85046729,11.275664759,11.452012648,13.136288998,14.574477314,13.204760664,14.104126763,14.690451207,10.593220339,12.108262108,13.518024032,11.612251767,11.964789334,8.9879872094,11.624880715,10.772304752,12.885251611,10.493179433,7.5918079096,9.4373219373,-0.667556742,-0.336587008,-0.512776686,4.148301789,2.9495965993,2.4324559117,1.2188751524,4.1972717733,3.0014124294,2.6709401709,0,0.1682935039,1.3674044953,0.5185377236,1.0410340939,1.042481105,1.7412502177,0.6995452956,1.5889830508,1.6025641026,1.8357810414,-18.34399192,-13.84497052,-14.51905626,-2.082068188,-8.33984884,-2.611875326,-13.81601959,-14.47740113,-11.21794872,1.8357810414,-18.17569842,-12.47756602,-14.00051854,-1.041034094,-7.297367735,-0.870625109,-13.11647429,-12.88841808,-9.615384615 +050,2,4,31,053,Nebraska,Dodge County,36691,36683,36671,36928,36587,36491,36607,36566,36702,36778,36679,36444,36222,-12,257,-341,-96,116,-41,136,76,-99,-235,-222,97,478,454,493,495,511,537,454,466,468,461,75,422,474,446,426,472,440,434,472,424,428,22,56,-20,47,69,39,97,20,-6,44,33,3,5,8,2,60,77,111,69,61,32,30,-34,196,-335,-142,-7,-155,-69,-11,-154,-309,-286,-31,201,-327,-140,53,-78,42,58,-93,-277,-256,-3,0,6,-3,-6,-2,-3,-2,0,-2,1,1003,1003,1250,1145,1205,1243,1193,1211,1201,1158,1122,1068,12.98930692,12.351220839,13.492432743,13.543462201,13.966900359,14.658513949,12.357103974,12.687694842,12.800350095,12.6881898,11.467547113,12.895327484,12.20613591,11.655585652,12.900933404,12.010700442,11.81273816,12.85105572,11.596898377,11.779924586,1.5217598065,-0.544106645,1.2862968335,1.8878765493,1.065966955,2.6478135066,0.5443658138,-0.163360878,1.2034517183,0.9082652134,0.1358714113,0.217642658,0.0547360355,1.641631782,2.104601424,3.029972157,1.8780620577,1.6608355909,0.8752376133,0.8256956486,5.3261593228,-9.113786302,-3.886258518,-0.191523708,-4.236535334,-1.883496206,-0.299401198,-4.192929197,-8.451513204,-7.87163185,5.4620307341,-8.896143644,-3.831522483,1.4501080741,-2.13193391,1.1464759513,1.5786608601,-2.532093606,-7.57627559,-7.045936201 +050,2,4,31,055,Nebraska,Douglas County,517110,517120,518599,524264,530899,536923,543236,549313,555880,561099,566523,570860,574332,1479,5665,6635,6024,6313,6077,6567,5219,5424,4337,3472,2086,8129,8340,8482,8536,8755,8720,8585,8282,8250,8194,917,3730,3727,3997,3892,4153,3992,4171,4155,4067,4329,1169,4399,4613,4485,4644,4602,4728,4414,4127,4183,3865,262,908,1188,1237,1977,1614,2517,1961,1433,836,671,86,373,899,350,-186,-69,-647,-1129,-124,-694,-1100,348,1281,2087,1587,1791,1545,1870,832,1309,142,-429,-38,-15,-65,-48,-122,-70,-31,-27,-12,12,36,12188,12188,12113,12420,12420,12522,12604,12562,12364,12589,12435,12040,15.589775455,15.807984169,15.886542888,15.805080548,16.026741135,15.780049276,15.371819882,14.689319648,14.506986653,14.31026413,7.153384481,7.0643113908,7.4862664377,7.2063464731,7.602405018,7.2240776045,7.4683588501,7.36949084,7.1515048141,7.5603042983,8.4363909737,8.7436727785,8.4002764506,8.5987340753,8.4243361167,8.5559716719,7.9034610319,7.3198288079,7.3554818386,6.7499598321,1.7413600828,2.2517847953,2.316865545,3.6605721935,2.9545585598,4.5548605538,3.5112567022,2.5416318589,1.4700413141,1.1718558984,0.7153384481,1.7040021305,0.6555399683,-0.344393742,-0.126310124,-1.170836225,-2.021524129,-0.219931857,-1.220345301,-1.921075243,2.4566985309,3.9557869258,2.9724055133,3.3161784515,2.8282484355,3.3840243288,1.4897325733,2.3217000023,0.2496960127,-0.749219345 +050,2,4,31,057,Nebraska,Dundy County,2008,2008,2008,1976,1979,1955,1864,1771,1807,1786,1742,1686,1671,0,-32,3,-24,-91,-93,36,-21,-44,-56,-15,6,15,8,19,13,14,21,19,15,26,20,8,21,41,32,36,21,15,32,38,15,25,-2,-6,-33,-13,-23,-7,6,-13,-23,11,-5,0,-1,-2,-3,-2,-2,-2,-1,-1,-1,0,2,-26,39,-7,-67,-86,32,-7,-20,-65,-10,2,-27,37,-10,-69,-88,30,-8,-21,-66,-10,0,1,-1,-1,1,2,0,0,0,-1,0,41,41,41,32,25,35,27,33,32,32,32,27,7.5301204819,4.0455120101,9.6593797661,6.8080649385,7.7028885832,11.738401342,10.576120234,8.5034013605,15.169194866,11.915400655,10.542168675,20.733249052,16.26842908,18.853102907,11.554332875,8.3845723868,17.812413025,21.541950113,8.7514585764,14.894250819,-3.012048193,-16.68773704,-6.609049314,-12.04503797,-3.851444292,3.3538289547,-7.236292792,-13.03854875,6.4177362894,-2.978850164,-0.502008032,-1.011378003,-1.525165226,-1.047394606,-1.100412655,-1.117942985,-0.556637907,-0.566893424,-0.583430572,0,-13.05220884,19.721871049,-3.558718861,-35.0877193,-47.31774415,17.887087759,-3.896465349,-11.33786848,-37.92298716,-5.957700328,-13.55421687,18.710493047,-5.083884087,-36.1351139,-48.41815681,16.769144774,-4.453103256,-11.9047619,-38.50641774,-5.957700328 +050,2,4,31,059,Nebraska,Fillmore County,5890,5890,5869,5825,5710,5635,5601,5552,5619,5559,5531,5484,5519,-21,-44,-115,-75,-34,-49,67,-60,-28,-47,35,10,53,54,46,60,62,65,71,59,62,59,28,76,92,90,80,101,83,85,88,60,80,-18,-23,-38,-44,-20,-39,-18,-14,-29,2,-21,0,1,1,0,0,0,0,0,0,0,0,-2,-22,-79,-31,-13,-10,85,-46,1,-48,56,-2,-21,-78,-31,-13,-10,85,-46,1,-48,56,-1,0,1,0,-1,0,0,0,0,-1,0,222,222,222,228,219,215,192,213,190,186,189,194,9.0644775098,9.3628088427,8.1092992508,10.67995728,11.11808482,11.637275087,12.703524781,10.640216411,11.257376305,10.724347905,12.998118693,15.951452102,15.866020273,14.23994304,18.11171882,14.859905111,15.20844516,15.870153291,10.894235134,14.541488685,-3.933641184,-6.58864326,-7.756721022,-3.55998576,-6.993634,-3.222630024,-2.504920379,-5.22993688,0.3631411711,-3.81714078,0.1710278775,0.1733853489,0,0,0,0,0,0,0,0,-3.762613306,-13.69744257,-5.464962539,-2.313990744,-1.793239487,15.217975114,-8.230452675,0.180342651,-8.715388107,10.179042079,-3.591585428,-13.52405722,-5.464962539,-2.313990744,-1.793239487,15.217975114,-8.230452675,0.180342651,-8.715388107,10.179042079 +050,2,4,31,061,Nebraska,Franklin County,3225,3225,3244,3204,3183,3065,3048,2976,2996,2976,2991,2945,2940,19,-40,-21,-118,-17,-72,20,-20,15,-46,-5,7,26,29,25,28,23,30,42,34,32,36,4,44,48,39,38,40,39,43,36,29,36,3,-18,-19,-14,-10,-17,-9,-1,-2,3,0,0,0,0,0,0,0,0,0,0,0,0,16,-21,-2,-104,-7,-55,28,-20,18,-48,-4,16,-21,-2,-104,-7,-55,28,-20,18,-48,-4,0,-1,0,0,0,0,1,1,-1,-1,-1,59,59,59,56,31,31,24,35,22,46,17,23,8.064516129,9.0809456709,8.0025608195,9.1608048421,7.636122178,10.046885466,14.065639652,11.396011396,10.781671159,12.234494477,13.64764268,15.030530766,12.483994878,12.432520857,13.280212483,13.060951105,14.400535834,12.066365008,9.7708894879,12.234494477,-5.583126551,-5.949585095,-4.481434059,-3.271716015,-5.644090305,-3.01406564,-0.334896182,-0.670353612,1.0107816712,0,0,0,0,0,0,0,0,0,0,0,-6.513647643,-0.626272115,-33.29065301,-2.290201211,-18.26029216,9.3770931011,-6.697923644,6.0331825038,-16.17250674,-1.359388275,-6.513647643,-0.626272115,-33.29065301,-2.290201211,-18.26029216,9.3770931011,-6.697923644,6.0331825038,-16.17250674,-1.359388275 +050,2,4,31,063,Nebraska,Frontier County,2756,2756,2760,2714,2719,2715,2721,2629,2651,2623,2598,2631,2587,4,-46,5,-4,6,-92,22,-28,-25,33,-44,6,26,23,21,30,22,33,23,25,24,27,0,13,27,18,24,18,18,21,17,21,16,6,13,-4,3,6,4,15,2,8,3,11,0,2,1,1,2,1,1,1,0,0,0,-1,-61,9,-8,-1,-98,5,-30,-34,29,-53,-1,-59,10,-7,1,-97,6,-29,-34,29,-53,-1,0,-1,0,-1,1,1,-1,1,1,-2,113,113,113,113,113,113,113,113,114,113,113,113,9.4994519547,8.4667771029,7.7291129923,11.037527594,8.2242990654,12.5,8.7220326128,9.5767094426,9.1795754446,10.348792641,4.7497259773,9.9392600773,6.6249539934,8.8300220751,6.7289719626,6.8181818182,7.9635949943,6.512162421,8.0321285141,6.1326178612,4.7497259773,-1.472482974,1.1041589989,2.2075055188,1.4953271028,5.6818181818,0.7584376185,3.0645470216,1.1474469306,4.2161747796,0.7307270734,0.3681207436,0.3680529996,0.7358351729,0.3738317757,0.3787878788,0.3792188093,0,0,0,-22.28717574,3.3130866924,-2.944423997,-0.367917586,-36.63551402,1.8939393939,-11.37656428,-13.02432484,11.091986996,-20.31429667,-21.55644867,3.681207436,-2.576370997,0.3679175865,-36.26168224,2.2727272727,-10.99734547,-13.02432484,11.091986996,-20.31429667 +050,2,4,31,065,Nebraska,Furnas County,4959,4959,4945,4914,4884,4831,4852,4828,4751,4765,4694,4690,4653,-14,-31,-30,-53,21,-24,-77,14,-71,-4,-37,11,39,44,46,52,56,44,71,54,70,62,27,76,57,71,79,73,61,67,73,49,48,-16,-37,-13,-25,-27,-17,-17,4,-19,21,14,0,0,0,0,0,0,1,2,0,1,0,3,6,-16,-27,47,-7,-62,9,-50,-27,-50,3,6,-16,-27,47,-7,-61,11,-50,-26,-50,-1,0,-1,-1,1,0,1,-1,-2,1,-1,81,81,81,80,80,77,80,80,78,78,62,60,7.9115528958,8.9814247806,9.4698919197,10.740472994,11.570247934,9.1867627101,14.922236234,11.417697431,14.919011083,13.271968319,15.41738513,11.635027557,14.616572311,16.317257048,15.082644628,12.736193757,14.081546868,15.435035416,10.443307758,10.275072247,-7.505832235,-2.653602776,-5.146680391,-5.576784055,-3.512396694,-3.549431047,0.8406893653,-4.017337985,4.4757033248,2.9968960719,0,0,0,0,0,0.2087900616,0.4203446826,0,0.2131287298,0,1.217161984,-3.265972647,-5.558414822,9.707735206,-1.446280992,-12.94498382,1.8915510719,-10.57194207,-5.754475703,-10.70320026,1.217161984,-3.265972647,-5.558414822,9.707735206,-1.446280992,-12.73619376,2.3118957545,-10.57194207,-5.541346974,-10.70320026 +050,2,4,31,067,Nebraska,Gage County,22311,22311,22269,21911,21656,21767,21561,21718,21622,21644,21499,21542,21431,-42,-358,-255,111,-206,157,-96,22,-145,43,-111,62,231,231,261,253,226,222,246,243,217,209,94,286,269,287,266,274,279,272,280,248,278,-32,-55,-38,-26,-13,-48,-57,-26,-37,-31,-69,0,-4,0,-1,0,3,11,15,11,9,5,-8,-301,-219,140,-194,204,-49,35,-120,67,-48,-8,-305,-219,139,-194,207,-38,50,-109,76,-43,-2,2,2,-2,1,-2,-1,-2,1,-2,1,523,523,523,510,570,540,536,517,508,485,485,536,10.457220462,10.604356508,12.021279046,11.678360414,10.44386423,10.244577757,11.37151574,11.264863361,10.083408843,9.7270379075,12.947034857,12.348796107,13.218801096,12.278434269,12.662030084,12.874942317,12.573383257,12.98008947,11.52389582,12.938356643,-2.489814396,-1.744439599,-1.197522051,-0.600073855,-2.218165854,-2.630364559,-1.201867517,-1.715226109,-1.440486978,-3.211318735,-0.181077411,0,-0.04605854,0,0.1386353659,0.5076142132,0.6933851061,0.5099320863,0.4182058967,0.2327042562,-13.62607515,-10.05348085,6.4481956567,-8.954948301,9.42720488,-2.261190586,1.6178985809,-5.562895487,3.1133105643,-2.233960859,-13.80715256,-10.05348085,6.4021371163,-8.954948301,9.5658402458,-1.753576373,2.311283687,-5.052963401,3.531516461,-2.001256603 +050,2,4,31,069,Nebraska,Garden County,2057,2057,2075,2063,1984,1924,1909,1917,1904,1892,1891,1822,1847,18,-12,-79,-60,-15,8,-13,-12,-1,-69,25,5,23,15,20,16,26,14,20,22,13,12,3,37,30,38,30,30,26,27,24,25,29,2,-14,-15,-18,-14,-4,-12,-7,-2,-12,-17,0,0,0,0,0,0,0,0,0,0,0,15,3,-67,-43,-1,13,-3,-4,2,-57,42,15,3,-67,-43,-1,13,-3,-4,2,-57,42,1,-1,3,1,0,-1,2,-1,-1,0,0,36,36,36,37,35,33,34,31,24,24,21,21,11.116481392,7.4128984433,10.235414534,8.348552048,13.591217982,7.3279246271,10.537407798,11.630980703,7.002423916,6.5412919052,17.883035283,14.825796887,19.447287615,15.65353509,15.682174595,13.609002879,14.225500527,12.688342585,13.466199838,15.808122104,-6.766553891,-7.412898443,-9.211873081,-7.304983042,-2.090956613,-6.281078252,-3.688092729,-1.057361882,-6.463775922,-9.266830199,0,0,0,0,0,0,0,0,0,0,1.4499758337,-33.11094638,-22.00614125,-0.521784503,6.7956089911,-1.570269563,-2.10748156,1.0573618821,-30.70293563,22.894521668,1.4499758337,-33.11094638,-22.00614125,-0.521784503,6.7956089911,-1.570269563,-2.10748156,1.0573618821,-30.70293563,22.894521668 +050,2,4,31,071,Nebraska,Garfield County,2049,2047,2033,2008,1994,2021,1999,2013,1991,1985,1969,1970,1956,-14,-25,-14,27,-22,14,-22,-6,-16,1,-14,1,15,10,11,19,24,13,14,26,20,23,16,30,30,43,28,27,33,46,41,30,27,-15,-15,-20,-32,-9,-3,-20,-32,-15,-10,-4,0,0,0,0,0,0,0,0,0,0,0,1,-9,6,59,-13,18,-3,26,-1,10,-9,1,-9,6,59,-13,18,-3,26,-1,10,-9,0,-1,0,0,0,-1,1,0,0,1,-1,30,30,30,38,51,47,53,60,37,54,51,60,7.423904974,4.9975012494,5.4794520548,9.4527363184,11.964107677,6.4935064935,7.0422535211,13.151239251,10.15486164,11.716760061,14.847809948,14.992503748,21.419676214,13.930348259,13.459621137,16.483516484,23.138832998,20.738492666,15.23229246,13.754457463,-7.423904974,-9.995002499,-15.94022416,-4.47761194,-1.49551346,-9.99000999,-16.09657948,-7.587253414,-5.07743082,-2.037697402,0,0,0,0,0,0,0,0,0,0,-4.454342984,2.9985007496,29.389788294,-6.467661692,8.9730807577,-1.498501499,13.078470825,-0.505816894,5.07743082,-4.584819154,-4.454342984,2.9985007496,29.389788294,-6.467661692,8.9730807577,-1.498501499,13.078470825,-0.505816894,5.07743082,-4.584819154 +050,2,4,31,073,Nebraska,Gosper County,2044,2044,2040,1990,2078,2017,2004,2025,2026,2027,1987,1978,1986,-4,-50,88,-61,-13,21,1,1,-40,-9,8,2,22,26,23,22,21,23,25,17,20,23,12,26,17,32,23,18,22,30,20,20,23,-10,-4,9,-9,-1,3,1,-5,-3,0,0,0,0,0,0,0,0,0,0,0,0,0,6,-46,78,-53,-12,19,0,6,-37,-9,10,6,-46,78,-53,-12,19,0,6,-37,-9,10,0,0,1,1,0,-1,0,0,0,0,-2,40,40,40,44,41,45,44,40,40,41,41,40,10.918114144,12.782694199,11.233211233,10.942551604,10.424422934,11.355220933,12.336540834,8.4703537618,10.088272383,11.60443996,12.903225806,8.3579154376,15.628815629,11.439940313,8.9352196575,10.861515675,14.803849001,9.9651220727,10.088272383,11.60443996,-1.985111663,4.4247787611,-4.395604396,-0.497388709,1.4892032762,0.493705258,-2.467308167,-1.494768311,0,0,0,0,0,0,0,0,0,0,0,0,-22.82878412,38.348082596,-25.88522589,-5.968664511,9.4316207496,0,2.9607698001,-18.43547583,-4.539722573,5.0454086781,-22.82878412,38.348082596,-25.88522589,-5.968664511,9.4316207496,0,2.9607698001,-18.43547583,-4.539722573,5.0454086781 +050,2,4,31,075,Nebraska,Grant County,614,614,614,635,626,635,628,648,666,651,670,631,630,0,21,-9,9,-7,20,18,-15,19,-39,-1,3,13,5,11,7,10,9,12,12,6,6,3,4,6,7,6,6,1,6,8,7,8,0,9,-1,4,1,4,8,6,4,-1,-2,0,0,0,0,0,0,0,0,0,0,0,0,11,-8,5,-10,16,10,-21,16,-37,1,0,11,-8,5,-10,16,10,-21,16,-37,1,0,1,0,0,2,0,0,0,-1,-1,0,3,3,3,3,3,3,3,3,3,3,3,3,20.816653323,7.9302141158,17.446471055,11.084718923,15.673981191,13.698630137,18.223234624,18.168054504,9.2236740968,9.5162569389,6.4051240993,9.5162569389,11.102299762,9.5011876485,9.4043887147,1.5220700152,9.1116173121,12.112036336,10.760953113,12.688342585,14.411529223,-1.586042823,6.3441712926,1.5835312747,6.2695924765,12.176560122,9.1116173121,6.0560181681,-1.537279016,-3.172085646,0,0,0,0,0,0,0,0,0,0,17.614091273,-12.68834259,7.9302141158,-15.83531275,25.078369906,15.220700152,-31.89066059,24.224072672,-56.8793236,1.5860428232,17.614091273,-12.68834259,7.9302141158,-15.83531275,25.078369906,15.220700152,-31.89066059,24.224072672,-56.8793236,1.5860428232 +050,2,4,31,077,Nebraska,Greeley County,2538,2538,2546,2534,2463,2482,2482,2435,2400,2362,2357,2368,2319,8,-12,-71,19,0,-47,-35,-38,-5,11,-49,8,30,29,25,28,32,29,25,28,29,26,4,36,31,22,28,29,29,35,27,22,32,4,-6,-2,3,0,3,0,-10,1,7,-6,0,1,0,0,1,1,0,0,0,0,0,5,-8,-72,15,-1,-52,-34,-28,-7,5,-42,5,-7,-72,15,0,-51,-34,-28,-7,5,-42,-1,1,3,1,0,1,-1,0,1,-1,-1,53,53,53,55,56,57,57,56,56,56,57,57,11.811023622,11.606964179,10.111223458,11.281224819,13.016066707,11.995863495,10.499790004,11.866920958,12.275132275,11.094516748,14.173228346,12.407444467,8.8978766431,11.281224819,11.795810454,11.995863495,14.699706006,11.443102352,9.3121693122,13.654789844,-2.362204724,-0.800480288,1.213346815,0,1.2202562538,0,-4.199916002,0.4238186056,2.962962963,-2.560273096,0.3937007874,0,0,0.4029008864,0.4067520846,0,0,0,0,0,-3.149606299,-28.81729037,6.0667340748,-0.402900886,-21.1511084,-14.06411582,-11.7597648,-2.966730239,2.1164021164,-17.92191167,-2.755905512,-28.81729037,6.0667340748,0,-20.74435631,-14.06411582,-11.7597648,-2.966730239,2.1164021164,-17.92191167 +050,2,4,31,079,Nebraska,Hall County,58607,58621,58813,59508,60105,60498,61103,61135,61404,61294,61510,61454,61028,192,695,597,393,605,32,269,-110,216,-56,-426,220,933,901,906,1018,1009,995,930,985,912,938,105,566,514,528,490,555,533,597,575,558,550,115,367,387,378,528,454,462,333,410,354,388,62,213,219,247,331,264,358,374,317,214,169,22,116,5,-228,-244,-692,-551,-820,-512,-624,-979,84,329,224,19,87,-428,-193,-446,-195,-410,-810,-7,-1,-14,-4,-10,6,0,3,1,0,-4,1118,1118,1120,1115,1126,1130,1134,1117,1077,1037,944,820,15.770657787,15.065252105,15.024501878,16.743283361,16.508777958,16.23972776,15.159171299,16.041822742,14.833609837,15.316536307,9.5671943273,8.5943835536,8.7560010945,8.0591442505,9.080645953,8.6992712524,9.7312099627,9.3645158138,9.0758270713,8.9809114809,6.2034634596,6.4708685511,6.2685007836,8.6841391107,7.4281320048,7.5404565077,5.427961336,6.6773069281,5.7577827657,6.3356248265,3.6003752504,3.6618093351,4.0960838453,5.4440341774,4.3194423993,5.8430377268,6.0962688878,5.1626982834,3.4806935363,2.7595891641,1.960767742,0.0836029529,-3.781000473,-4.013124892,-11.32217477,-8.993055272,-13.36615104,-8.338490603,-10.14931199,-15.98602244,5.5611429924,3.745412288,0.3150833727,1.4309092853,-7.002732375,-3.150017545,-7.26988215,-3.175792319,-6.668618457,-13.22643327 +050,2,4,31,081,Nebraska,Hamilton County,9124,9114,9127,9079,9042,9123,9101,9138,9167,9193,9213,9285,9237,13,-48,-37,81,-22,37,29,26,20,72,-48,22,89,99,110,95,92,116,115,116,100,106,16,81,75,79,100,91,71,86,92,65,86,6,8,24,31,-5,1,45,29,24,35,20,1,1,1,1,-1,-1,0,1,0,0,0,6,-57,-63,51,-17,38,-16,-4,-3,37,-67,7,-56,-62,52,-18,37,-16,-3,-3,37,-67,0,0,1,-2,1,-1,0,0,-1,0,-1,124,124,124,129,125,118,106,90,106,118,123,126,9.7769965945,10.926549307,12.111202863,10.425812116,10.088272383,12.674132751,12.527233115,12.604585461,10.811979673,11.445848181,8.89816544,8.2776888693,8.6980456923,10.974539069,9.9786172488,7.7574433215,9.3681917211,9.9967401934,7.0277867878,9.2862541842,0.8788311546,2.6488604382,3.4131571704,-0.548726953,0.1096551346,4.9166894291,3.1590413943,2.6078452678,3.7841928857,2.1595939963,0.1098538943,0.1103691849,0.1101018442,-0.109745391,-0.109655135,0,0.1089324619,0,0,0,-6.261671976,-6.95325865,5.6151940545,-1.865671642,4.1668951149,-1.748156241,-0.435729847,-0.325980658,4.0004324792,-7.234639888,-6.151818082,-6.842889465,5.7252958987,-1.975417032,4.0572399803,-1.748156241,-0.326797386,-0.325980658,4.0004324792,-7.234639888 +050,2,4,31,083,Nebraska,Harlan County,3423,3417,3422,3436,3411,3487,3468,3440,3441,3415,3363,3372,3311,5,14,-25,76,-19,-28,1,-26,-52,9,-61,5,48,29,41,41,42,29,42,36,31,34,2,49,51,56,30,36,42,49,43,32,35,3,-1,-22,-15,11,6,-13,-7,-7,-1,-1,0,1,1,0,0,0,0,0,0,0,0,2,14,-2,89,-31,-34,15,-18,-46,11,-60,2,15,-1,89,-31,-34,15,-18,-46,11,-60,0,0,-2,2,1,0,-1,-1,1,-1,0,47,47,47,46,39,40,40,42,42,40,45,45,13.998250219,8.4708631517,11.887503624,11.79007908,12.159814708,8.4290074117,12.252042007,10.622602538,9.2056421678,10.175071076,14.289880432,14.897035198,16.236590316,8.6268871316,10.422698321,12.207527976,14.294049008,12.688108587,9.5025983667,10.474337872,-0.291630213,-6.426172046,-4.349086692,3.1631919482,1.7371163868,-3.778520564,-2.042007001,-2.065506049,-0.296956199,-0.299266796,0.2916302129,0.2920987294,0,0,0,0,0,0,0,0,4.0828229805,-0.584197459,25.804581038,-8.914450036,-9.843659525,4.3598314199,-5.250875146,-13.57332546,3.2665181886,-17.95600778,4.3744531934,-0.292098729,25.804581038,-8.914450036,-9.843659525,4.3598314199,-5.250875146,-13.57332546,3.2665181886,-17.95600778 +050,2,4,31,085,Nebraska,Hayes County,967,960,956,952,919,947,910,916,896,895,912,911,916,-4,-4,-33,28,-37,6,-20,-1,17,-1,5,2,15,8,13,10,13,20,13,20,16,10,0,8,7,2,5,5,4,6,5,6,7,2,7,1,11,5,8,16,7,15,10,3,0,0,0,3,0,0,1,1,1,1,1,-7,-10,-37,14,-43,-3,-36,-9,2,-12,1,-7,-10,-37,17,-43,-3,-35,-8,3,-11,2,1,-1,3,0,1,1,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,15.72327044,8.551576697,13.933547696,10.770059235,14.238773275,22.075055188,14.517029592,22.136137244,17.553483269,10.946907499,8.3857442348,7.4826296098,2.1436227224,5.3850296177,5.4764512596,4.4150110375,6.7001675042,5.534034311,6.582556226,7.662835249,7.3375262055,1.0689470871,11.789924973,5.3850296177,8.7623220153,17.66004415,7.8168620882,16.602102933,10.970927043,3.2840722496,0,0,3.2154340836,0,0,1.1037527594,1.116694584,1.1068068622,1.0970927043,1.0946907499,-10.48218029,-39.55104222,15.005359057,-46.31125471,-3.285870756,-39.73509934,-10.05025126,2.2136137244,-13.16511245,1.0946907499,-10.48218029,-39.55104222,18.22079314,-46.31125471,-3.285870756,-38.63134658,-8.933556672,3.3204205866,-12.06801975,2.1893814997 +050,2,4,31,087,Nebraska,Hitchcock County,2908,2908,2897,2857,2871,2852,2878,2878,2820,2804,2786,2759,2773,-11,-40,14,-19,26,0,-58,-16,-18,-27,14,9,37,29,33,23,47,24,31,21,23,25,18,36,34,41,38,36,39,41,33,35,42,-9,1,-5,-8,-15,11,-15,-10,-12,-12,-17,1,0,1,5,0,0,0,0,0,0,0,-2,-43,19,-17,40,-9,-44,-7,-5,-15,31,-1,-43,20,-12,40,-9,-44,-7,-5,-15,31,-1,2,-1,1,1,-2,1,1,-1,0,0,26,26,26,30,26,30,30,32,28,26,26,25,12.8606187,10.125698324,11.53241307,8.0279232112,16.330785268,8.424008424,11.024182077,7.5134168157,8.2957619477,9.0383224873,12.513034411,11.87150838,14.328149572,13.263525305,12.508686588,13.689013689,14.580369844,11.806797853,12.623985573,15.184381779,0.3475842892,-1.745810056,-2.795736502,-5.235602094,3.8220986796,-5.265005265,-3.556187767,-4.293381038,-4.328223625,-6.146059291,0,0.3491620112,1.7473353136,0,0,0,0,0,0,0,-14.94612444,6.6340782123,-5.940940066,13.961605585,-3.127171647,-15.44401544,-2.489331437,-1.788908766,-5.410279531,11.207519884,-14.94612444,6.9832402235,-4.193604753,13.961605585,-3.127171647,-15.44401544,-2.489331437,-1.788908766,-5.410279531,11.207519884 +050,2,4,31,089,Nebraska,Holt County,10435,10435,10434,10443,10378,10382,10361,10266,10229,10195,10152,10084,9956,-1,9,-65,4,-21,-95,-37,-34,-43,-68,-128,24,151,134,137,144,145,141,143,136,127,128,23,131,118,119,116,148,114,125,156,105,110,1,20,16,18,28,-3,27,18,-20,22,18,1,9,4,1,4,1,9,14,6,11,6,-2,-20,-86,-13,-54,-93,-74,-66,-28,-101,-150,-1,-11,-82,-12,-50,-92,-65,-52,-22,-90,-144,-1,0,1,-2,1,0,1,0,-1,0,-2,160,160,160,154,137,118,141,154,137,112,103,99,14.465679935,12.871619999,13.198458574,13.884201899,14.05924274,13.759453525,14.003133568,13.368064088,12.551887725,12.774451098,12.549695838,11.334710148,11.464354528,11.184495975,14.350123624,11.124664552,12.240501371,15.333955866,10.377544969,10.978043912,1.9159840973,1.5369098506,1.7341040462,2.6997059249,-0.290880884,2.6347889729,1.7626321974,-1.965891778,2.1743427555,1.7964071856,0.8621928438,0.3842274627,0.0963391137,0.385672275,0.0969602948,0.878262991,1.3709361535,0.5897675333,1.0871713777,0.5988023952,-1.915984097,-8.260890447,-1.252408478,-5.206575712,-9.017307413,-7.221273481,-6.462984724,-2.752248489,-9.982209923,-14.97005988,-1.053791254,-7.876662984,-1.156069364,-4.820903437,-8.920347118,-6.34301049,-5.09204857,-2.162480955,-8.895038545,-14.37125749 +050,2,4,31,091,Nebraska,Hooker County,736,736,737,743,718,731,722,714,684,666,670,668,647,1,6,-25,13,-9,-8,-30,-18,4,-2,-21,2,5,7,6,10,6,8,6,8,5,5,1,5,16,9,13,16,24,11,13,11,9,1,0,-9,-3,-3,-10,-16,-5,-5,-6,-4,0,0,0,0,0,0,0,0,0,0,0,0,5,-16,16,-7,2,-15,-13,9,5,-17,0,5,-16,16,-7,2,-15,-13,9,5,-17,0,1,0,0,1,0,1,0,0,-1,0,26,26,26,25,28,27,26,22,23,22,23,23,6.7567567568,9.582477755,8.281573499,13.764624914,8.356545961,11.444921316,8.8888888889,11.976047904,7.4738415546,7.6045627376,6.7567567568,21.902806297,12.422360248,17.894012388,22.284122563,34.334763948,16.296296296,19.461077844,16.44245142,13.688212928,0,-12.32032854,-4.140786749,-4.129387474,-13.9275766,-22.88984263,-7.407407407,-7.48502994,-8.968609865,-6.08365019,0,0,0,0,0,0,0,0,0,0,6.7567567568,-21.9028063,22.084195997,-9.63523744,2.7855153203,-21.45922747,-19.25925926,13.473053892,7.4738415546,-25.85551331,6.7567567568,-21.9028063,22.084195997,-9.63523744,2.7855153203,-21.45922747,-19.25925926,13.473053892,7.4738415546,-25.85551331 +050,2,4,31,093,Nebraska,Howard County,6274,6274,6279,6295,6296,6335,6350,6378,6394,6391,6446,6423,6488,5,16,1,39,15,28,16,-3,55,-23,65,20,63,71,81,77,80,74,87,69,77,78,3,60,65,77,71,49,75,84,57,71,79,17,3,6,4,6,31,-1,3,12,6,-1,0,1,1,1,1,0,2,1,1,1,1,-12,12,-4,33,10,-3,16,-7,43,-29,65,-12,13,-3,34,11,-3,18,-6,44,-28,66,0,0,-2,1,-2,0,-1,0,-1,-1,0,35,35,35,40,40,42,70,68,63,66,66,66,10.020677589,11.27789691,12.825587839,12.140323216,12.570710245,11.587848418,13.609698866,10.750175275,11.966741783,12.082720161,9.5435024654,10.3248352,12.192225477,11.194324005,7.6995600251,11.744440965,13.140398905,8.8805795747,11.034268397,12.23762683,0.4771751233,0.9530617107,0.6333623624,0.9459992117,4.87115022,-0.156592546,0.4692999609,1.8695956999,0.9324733857,-0.154906669,0.1590583744,0.1588436185,0.1583405906,0.1576665353,0,0.3131850924,0.1564333203,0.1557996417,0.1554122309,0.1549066687,1.9087004931,-0.635374474,5.2252394901,1.5766653528,-0.471401634,2.5054807391,-1.095033242,6.6993845914,-4.506954697,10.068933468,2.0677588675,-0.476530855,5.3835800808,1.7343318881,-0.471401634,2.8186658315,-0.938599922,6.8551842331,-4.351542466,10.223840136 +050,2,4,31,095,Nebraska,Jefferson County,7547,7547,7521,7553,7536,7511,7299,7224,7167,7161,7062,7020,7099,-26,32,-17,-25,-212,-75,-57,-6,-99,-42,79,10,82,74,77,89,62,77,91,70,95,84,18,102,121,116,127,101,109,99,109,102,95,-8,-20,-47,-39,-38,-39,-32,-8,-39,-7,-11,0,4,2,5,3,13,6,6,4,3,2,-17,48,29,11,-182,-50,-30,-3,-63,-39,89,-17,52,31,16,-179,-37,-24,3,-59,-36,91,-1,0,-1,-2,5,1,-1,-1,-1,1,-1,105,105,105,106,106,101,94,95,99,88,95,99,10.879660342,9.8084697462,10.234598259,12.018906144,8.5381808166,10.701132652,12.702400893,9.8432116994,13.492401647,11.898859693,13.533236036,16.038173504,15.418355818,17.150573937,13.908971975,15.148356612,13.819095477,15.327286789,14.486578611,13.4570437,-2.653575693,-6.229703758,-5.18375756,-5.131667792,-5.370791159,-4.447223959,-1.116694584,-5.48407509,-0.994176963,-1.558184007,0.5307151386,0.2650937769,0.6645843025,0.4051316678,1.7902637196,0.8338544924,0.837520938,0.56246924,0.4260758415,0.2833061832,6.3685816638,3.8438597654,1.4620854655,-24.57798785,-6.885629691,-4.169272462,-0.418760469,-8.858890529,-5.538985939,12.607125151,6.8992968024,4.1089535423,2.1266697681,-24.17285618,-5.095365971,-3.33541797,0.418760469,-8.296421289,-5.112910098,12.890431334 +050,2,4,31,097,Nebraska,Johnson County,5217,5217,5233,5218,5187,5166,5222,5239,5206,5170,5105,5050,5057,16,-15,-31,-21,56,17,-33,-36,-65,-55,7,13,48,51,38,40,46,44,41,43,37,35,9,61,47,72,61,60,68,67,80,53,58,4,-13,4,-34,-21,-14,-24,-26,-37,-16,-23,0,1,0,1,1,3,0,8,11,0,2,11,-3,-38,12,73,29,-8,-19,-38,-40,28,11,-2,-38,13,74,32,-8,-11,-27,-40,30,1,0,3,0,3,-1,-1,1,-1,1,0,955,955,959,954,963,1045,1038,1035,1035,1024,1037,1056,9.1857238542,9.8029793369,7.3408673814,7.701193685,8.7945703088,8.4250837721,7.9028527371,8.3698296837,7.2870507139,6.9258929455,11.673524065,9.0341182124,13.909011881,11.74432037,11.471178664,13.020584011,12.914417887,15.571776156,10.438207779,11.477194024,-2.487800211,0.7688611245,-6.568144499,-4.043126685,-2.676608355,-4.595500239,-5.01156515,-7.201946472,-3.151157065,-4.551301078,0.191369247,0,0.1931807206,0.1925298421,0.5735589332,0,1.5420200463,2.1411192214,0,0.3957653112,-0.574107741,-7.304180682,2.3181686468,14.054678475,5.5444030207,-1.531833413,-3.66229761,-7.396593674,-7.877892664,5.5407143564,-0.382738494,-7.304180682,2.5113493673,14.247208317,6.1179619539,-1.531833413,-2.120277564,-5.255474453,-7.877892664,5.9364796676 +050,2,4,31,099,Nebraska,Kearney County,6489,6489,6476,6548,6509,6487,6590,6560,6568,6528,6587,6607,6652,-13,72,-39,-22,103,-30,8,-40,59,20,45,18,78,97,60,93,81,81,70,78,90,79,30,81,68,66,62,80,87,77,85,49,62,-12,-3,29,-6,31,1,-6,-7,-7,41,17,0,-1,-2,-1,-3,1,11,23,18,15,9,-1,77,-66,-15,74,-32,4,-56,49,-36,19,-1,76,-68,-16,71,-31,15,-33,67,-21,28,0,-1,0,0,1,0,-1,0,-1,0,0,84,84,84,84,83,85,81,83,82,72,73,73,11.977886978,14.857930612,9.2336103416,14.223445744,12.319391635,12.340036563,10.690287111,11.894776973,13.642564802,11.91643412,12.438574939,10.415868883,10.156971376,9.482297163,12.16730038,13.254113346,11.759315822,12.962256958,7.4276186145,9.3521381703,-0.460687961,4.4420617293,-0.923361034,4.7411485815,0.1520912548,-0.914076782,-1.069028711,-1.067479985,6.2149461877,2.5642959499,-0.153562654,-0.306349085,-0.153893506,-0.45882083,0.1520912548,1.6758074345,3.5125229078,2.7449485322,2.2737608004,1.3575684441,11.824324324,-10.1095198,-2.308402585,11.317580485,-4.866920152,0.6093845216,-8.552229688,7.4723598933,-5.457025921,2.8659778264,11.670761671,-10.41586888,-2.462296091,10.858759654,-4.714828897,2.2851919561,-5.039706781,10.217308425,-3.183265121,4.2235462705 +050,2,4,31,101,Nebraska,Keith County,8368,8371,8356,8245,8234,8173,8195,8159,8121,8097,8020,8021,7983,-15,-111,-11,-61,22,-36,-38,-24,-77,1,-38,19,76,81,74,70,77,84,104,78,89,82,41,90,79,106,83,97,110,95,80,94,92,-22,-14,2,-32,-13,-20,-26,9,-2,-5,-10,0,-4,2,-1,1,-2,0,-3,-3,-3,-3,8,-94,-14,-28,35,-13,-13,-30,-70,10,-25,8,-98,-12,-29,36,-15,-13,-33,-73,7,-28,-1,1,-1,0,-1,-1,1,0,-2,-1,0,55,55,55,50,38,41,42,41,44,35,25,30,9.1560749352,9.83069361,9.0205400134,8.5532746823,9.4166564755,10.319410319,12.825255889,9.6792206986,11.096565052,10.24743814,10.842720318,9.5879604345,12.921314073,10.14173998,11.862541274,13.513513514,11.715377975,9.9274058448,11.719967583,11.497125719,-1.686645383,0.2427331756,-3.90077406,-1.588465298,-2.445884799,-3.194103194,1.1098779134,-0.248185146,-0.623402531,-1.249687578,-0.481898681,0.2427331756,-0.121899189,0.1221896383,-0.24458848,0,-0.369959304,-0.372277719,-0.374041519,-0.374906273,-11.324619,-1.699132229,-3.413177302,4.2766373412,-1.589825119,-1.597051597,-3.699593045,-8.686480114,1.246805062,-3.124218945,-11.80651768,-1.456399053,-3.535076492,4.3988269795,-1.834413599,-1.597051597,-4.069552349,-9.058757833,0.8727635434,-3.499125219 +050,2,4,31,103,Nebraska,Keya Paha County,824,824,824,819,797,790,795,797,790,790,794,784,759,0,-5,-22,-7,5,2,-7,0,4,-10,-25,0,6,5,12,4,10,5,9,6,7,5,2,6,13,9,7,6,6,5,5,5,8,-2,0,-8,3,-3,4,-1,4,1,2,-3,0,0,1,0,0,0,0,0,0,0,0,2,-5,-16,-10,8,-2,-6,-3,2,-11,-23,2,-5,-15,-10,8,-2,-6,-3,2,-11,-23,0,0,1,0,0,0,0,-1,1,-1,1,0,0,0,0,0,0,0,0,0,0,0,0,7.3037127206,6.1881188119,15.122873346,5.047318612,12.56281407,6.3011972275,11.392405063,7.5757575758,8.8719898606,6.4808813999,7.3037127206,16.089108911,11.342155009,8.832807571,7.5376884422,7.561436673,6.3291139241,6.3131313131,6.3371356147,10.36941024,0,-9.900990099,3.7807183365,-3.785488959,5.0251256281,-1.260239445,5.0632911392,1.2626262626,2.5348542459,-3.88852884,0,1.2376237624,0,0,0,0,0,0,0,0,-6.086427267,-19.8019802,-12.60239445,10.094637224,-2.512562814,-7.561436673,-3.797468354,2.5252525253,-13.94169835,-29.81205444,-6.086427267,-18.56435644,-12.60239445,10.094637224,-2.512562814,-7.561436673,-3.797468354,2.5252525253,-13.94169835,-29.81205444 +050,2,4,31,105,Nebraska,Kimball County,3821,3821,3834,3807,3802,3694,3725,3715,3672,3567,3549,3597,3495,13,-27,-5,-108,31,-10,-43,-105,-18,48,-102,9,43,41,37,42,44,49,35,40,29,34,3,57,63,47,51,39,51,64,56,42,52,6,-14,-22,-10,-9,5,-2,-29,-16,-13,-18,5,26,2,8,9,8,2,1,2,1,1,3,-39,16,-107,30,-22,-43,-78,-4,60,-83,8,-13,18,-99,39,-14,-41,-77,-2,61,-82,-1,0,-1,1,1,-1,0,1,0,0,-2,48,48,48,42,46,44,42,47,44,45,50,50,11.255071326,10.776711789,9.8719316969,11.322280631,11.827956989,13.266549343,9.6698439011,11.242270939,8.1164287713,9.5882684715,14.919513153,16.559337626,12.540021345,13.748483623,10.483870968,13.808041153,17.682000276,15.739179314,11.754827876,14.664410603,-3.664441827,-5.782625838,-2.668089648,-2.426202992,1.3440860215,-0.54149181,-8.012156375,-4.496908375,-3.638399104,-5.076142132,6.8053919644,0.525693258,2.1344717182,2.4262029923,2.1505376344,0.5414918099,0.2762812543,0.5621135469,0.2798768542,0.2820078962,-10.20808795,4.2055460639,-28.54855923,8.0873433077,-5.913978495,-11.64207391,-21.54993784,-1.124227094,16.792611251,-23.40665539,-3.402695982,4.7312393219,-26.41408751,10.5135463,-3.76344086,-11.1005821,-21.27365658,-0.562113547,17.072488105,-23.12464749 +050,2,4,31,107,Nebraska,Knox County,8701,8701,8677,8575,8578,8555,8478,8472,8502,8447,8410,8337,8304,-24,-102,3,-23,-77,-6,30,-55,-37,-73,-33,23,89,107,103,107,94,106,100,115,97,101,43,119,107,118,133,113,102,128,110,92,99,-20,-30,0,-15,-26,-19,4,-28,5,5,2,0,1,4,2,2,0,4,4,2,2,2,-3,-73,0,-8,-54,14,23,-32,-42,-81,-36,-3,-72,4,-6,-52,14,27,-28,-40,-79,-34,-1,0,-1,-2,1,-1,-1,1,-2,1,-1,234,234,234,230,239,229,221,230,219,221,201,204,10.317644331,12.475951729,12.023580225,12.563846651,11.091445428,12.489690114,11.800106201,13.644183425,11.584164328,12.138693588,13.795501971,12.475951729,13.774587054,15.616743968,13.333333333,12.018381053,15.104135937,13.050958059,10.987042455,11.898323418,-3.47785764,0,-1.751006829,-3.052897317,-2.241887906,0.4713090609,-3.304029736,0.5932253663,0.5971218726,0.2403701701,0.115928588,0.4663907188,0.2334675772,0.2348382552,0,0.4713090609,0.472004248,0.2372901465,0.238848749,0.2403701701,-8.462786923,0,-0.933870309,-6.340632889,1.6519174041,2.7100271003,-3.776033984,-4.983093077,-9.673374336,-4.326663061,-8.346858335,0.4663907188,-0.700402732,-6.105794634,1.6519174041,3.1813361612,-3.304029736,-4.745802931,-9.434525587,-4.086292891 +050,2,4,31,109,Nebraska,Lancaster County,285407,285407,286175,289963,293515,297232,302775,306293,310561,313892,316372,318403,320650,768,3788,3552,3717,5543,3518,4268,3331,2480,2031,2247,1035,4067,4021,4137,4046,4082,4081,3978,3838,3854,3796,390,2010,1919,2026,1960,2156,2114,2229,2284,2268,2313,645,2057,2102,2111,2086,1926,1967,1749,1554,1586,1483,167,622,855,769,1387,1082,1445,1012,744,430,358,-12,1110,640,861,2038,540,860,581,189,7,380,155,1732,1495,1630,3425,1622,2305,1593,933,437,738,-32,-1,-45,-24,32,-30,-4,-11,-7,8,26,13816,13817,13986,14019,14037,15110,15211,15587,15256,14974,15149,15272,14.118145305,13.782867563,14.005995799,13.486509324,13.404086243,13.231656113,12.740750705,12.179023393,12.142885274,11.880078804,6.9774949752,6.5777972777,6.8591122765,6.533257112,7.0796692652,6.8541340414,7.1390480949,7.2477564957,7.1458390768,7.2388362155,7.1406503303,7.2050702854,7.146883522,6.9532522121,6.3244169781,6.3775220717,5.6017026101,4.9312668977,4.9970461975,4.6412425886,2.1592049127,2.9307017574,2.6034833863,4.6232793951,3.552969455,4.6850632402,3.2412367304,2.3609154259,1.3548107597,1.1204078535,3.8532434937,2.1937416664,2.9149534403,6.7932540787,1.7732010219,2.7883421361,1.8608285972,0.5997486767,0.0220550589,1.1892597328,6.0124484065,5.1244434237,5.5184368266,11.416533474,5.3261704769,7.4734053763,5.1020653276,2.9606641027,1.3768658186,2.3096675863 +050,2,4,31,111,Nebraska,Lincoln County,36288,36288,36250,36035,35979,35946,35661,35519,35528,35299,35182,34856,34347,-38,-215,-56,-33,-285,-142,9,-229,-117,-326,-509,116,415,452,427,411,419,442,423,426,414,400,105,342,345,356,353,390,355,403,362,361,404,11,73,107,71,58,29,87,20,64,53,-4,3,20,20,16,36,12,37,28,25,16,9,-51,-309,-186,-117,-385,-184,-114,-275,-207,-393,-512,-48,-289,-166,-101,-349,-172,-77,-247,-182,-377,-503,-1,1,3,-3,6,1,-1,-2,1,-2,-2,642,642,642,630,633,553,597,590,602,612,570,508,11.4823269,12.553114672,11.873479319,11.479324647,11.772969935,12.442467662,11.944597399,12.08836424,11.822153688,11.560192477,9.4625440963,9.5814702697,9.8992005561,9.8593712905,10.958134307,9.9933846609,11.379841021,10.27227196,10.308689569,11.675794402,2.0197828042,2.9716444025,1.9742787626,1.6199533565,0.814835628,2.4490830014,0.5647563782,1.8160922802,1.5134641195,-0.115601925,0.5533651518,0.5554475519,0.4449078902,1.0054882903,0.3371733633,1.0415640351,0.7906589295,0.7094110469,0.4568948285,0.2601043307,-8.549491596,-5.165662232,-3.253388947,-10.75313866,-5.169991571,-3.209143243,-7.7654002,-5.873923469,-11.22247923,-14.79704637,-7.996126444,-4.61021468,-2.808481057,-9.747650369,-4.832818207,-2.167579208,-6.974741271,-5.164512422,-10.7655844,-14.53694204 +050,2,4,31,113,Nebraska,Logan County,763,763,772,779,785,777,767,791,797,768,751,750,747,9,7,6,-8,-10,24,6,-29,-17,-1,-3,3,9,10,11,12,9,13,9,7,7,7,0,6,6,3,7,7,9,7,6,4,4,3,3,4,8,5,2,4,2,1,3,3,0,0,0,1,2,2,4,3,2,2,2,6,4,2,-16,-18,20,-3,-35,-21,-5,-8,6,4,2,-15,-16,22,1,-32,-19,-3,-6,0,0,0,-1,1,0,1,1,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,11.605415861,12.787723785,14.084507042,15.544041451,11.553273427,16.37279597,11.501597444,9.2165898618,9.3271152565,9.3520374081,7.7369439072,7.6726342711,3.8412291933,9.067357513,8.9858793325,11.335012594,8.945686901,7.8999341672,5.3297801466,5.3440213761,3.8684719536,5.1150895141,10.243277849,6.4766839378,2.567394095,5.0377833753,2.5559105431,1.3166556945,3.9973351099,4.0080160321,0,0,1.2804097311,2.5906735751,2.567394095,5.0377833753,3.8338658147,2.6333113891,2.6648900733,2.672010688,5.1579626048,2.557544757,-20.4865557,-23.31606218,25.67394095,-3.778337531,-44.7284345,-27.64976959,-6.662225183,-10.68804275,5.1579626048,2.557544757,-19.20614597,-20.7253886,28.241335045,1.2594458438,-40.89456869,-25.0164582,-3.99733511,-8.016032064 +050,2,4,31,115,Nebraska,Loup County,632,628,628,617,605,587,596,606,616,604,620,659,650,0,-11,-12,-18,9,10,10,-12,16,39,-9,0,5,8,4,5,8,7,5,6,7,7,3,4,5,3,2,8,6,9,10,11,10,-3,1,3,1,3,0,1,-4,-4,-4,-3,0,0,0,0,0,0,0,0,0,0,0,2,-11,-13,-19,5,10,9,-9,20,43,-6,2,-11,-13,-19,5,10,9,-9,20,43,-6,1,-1,-2,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,8.0321285141,13.093289689,6.711409396,8.4530853762,13.311148087,11.456628478,8.1967213115,9.8039215686,10.946051603,10.695187166,6.4257028112,8.1833060556,5.033557047,3.3812341505,13.311148087,9.8199672668,14.754098361,16.339869281,17.200938233,15.278838808,1.6064257028,4.9099836334,1.677852349,5.0718512257,0,1.6366612111,-6.557377049,-6.535947712,-6.25488663,-4.583651642,0,0,0,0,0,0,0,0,0,0,-17.67068273,-21.27659574,-31.87919463,8.4530853762,16.638935108,14.7299509,-14.75409836,32.679738562,67.240031274,-9.167303285,-17.67068273,-21.27659574,-31.87919463,8.4530853762,16.638935108,14.7299509,-14.75409836,32.679738562,67.240031274,-9.167303285 +050,2,4,31,117,Nebraska,McPherson County,539,539,539,551,509,528,510,489,503,493,494,493,474,0,12,-42,19,-18,-21,14,-10,1,-1,-19,0,2,4,2,3,3,5,4,2,2,2,1,5,3,2,1,4,7,8,1,3,4,-1,-3,1,0,2,-1,-2,-4,1,-1,-2,0,0,0,0,0,0,0,0,0,0,0,1,15,-44,19,-21,-22,17,-7,1,0,-16,1,15,-44,19,-21,-22,17,-7,1,0,-16,0,0,1,0,1,2,-1,1,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,3.6697247706,7.5471698113,3.8572806172,5.7803468208,6.006006006,10.080645161,8.0321285141,4.0526849037,4.0526849037,4.1365046536,9.1743119266,5.6603773585,3.8572806172,1.9267822736,8.008008008,14.112903226,16.064257028,2.0263424519,6.0790273556,8.2730093071,-5.504587156,1.8867924528,0,3.8535645472,-2.002002002,-4.032258065,-8.032128514,2.0263424519,-2.026342452,-4.136504654,0,0,0,0,0,0,0,0,0,0,27.52293578,-83.01886792,36.644165863,-40.46242775,-44.04404404,34.274193548,-14.0562249,2.0263424519,0,-33.09203723,27.52293578,-83.01886792,36.644165863,-40.46242775,-44.04404404,34.274193548,-14.0562249,2.0263424519,0,-33.09203723 +050,2,4,31,119,Nebraska,Madison County,34876,34876,34963,35012,35088,35155,35087,35001,34951,35128,35166,35059,34813,87,49,76,67,-68,-86,-50,177,38,-107,-246,121,561,507,505,511,544,514,502,534,501,495,51,325,323,406,371,373,358,375,391,362,375,70,236,184,99,140,171,156,127,143,139,120,13,33,43,60,111,94,101,88,75,40,33,9,-220,-150,-88,-323,-353,-308,-36,-180,-286,-397,22,-187,-107,-28,-212,-259,-207,52,-105,-246,-364,-5,0,-1,-4,4,2,1,-2,0,0,-2,1071,1071,1071,1093,1109,1081,1097,1052,1182,1235,1222,1218,16.034297964,14.465049929,14.378656948,14.54969961,15.523342084,14.6957914,14.326688452,15.193330867,14.268422926,14.168765743,9.2890317971,9.2154065621,11.559870734,10.563480539,10.643762128,10.235590119,10.702207509,11.124704811,10.309718761,10.733913442,6.7452661665,5.2496433666,2.8187862136,3.9862190712,4.8795799566,4.4602012809,3.6244809429,4.0686260563,3.9587041652,3.4348523014,0.9431939979,1.2268188302,1.708355281,3.1605022636,2.6823421984,2.887694419,2.511451362,2.1338947848,1.1391954432,0.9445843829,-6.287959986,-4.279600571,-2.505587745,-9.196776857,-10.07305102,-8.806038426,-1.027411921,-5.121347483,-8.145247419,-11.36363636,-5.344765988,-3.05278174,-0.797232464,-6.036274594,-7.390708823,-5.918344007,1.4840394412,-2.987452699,-7.006051976,-10.41905198 +050,2,4,31,121,Nebraska,Merrick County,7845,7859,7852,7762,7848,7834,7791,7806,7852,7877,7774,7818,7809,-7,-90,86,-14,-43,15,46,25,-103,44,-9,23,88,77,100,92,98,96,99,87,81,86,32,83,82,85,84,90,73,87,94,78,92,-9,5,-5,15,8,8,23,12,-7,3,-6,0,0,0,-1,0,0,9,9,7,4,4,2,-95,90,-27,-49,8,14,4,-103,38,-8,2,-95,90,-28,-49,8,23,13,-96,42,-4,0,0,1,-1,-2,-1,0,0,0,-1,1,197,197,197,197,195,196,196,196,197,195,195,198,11.271935443,9.865470852,12.753475322,11.776,12.566519202,12.26210244,12.588212855,11.117500479,10.389943561,11.006591156,10.631484565,10.506085842,10.840454024,10.752,11.5406809,9.3243070635,11.062368873,12.012012012,10.005130836,11.774492865,0.6404508774,-0.64061499,1.9130212983,1.024,1.0258383022,2.9377953762,1.5258439825,-0.894511533,0.3848127245,-0.767901709,0,0,-0.127534753,0,0,1.1495721037,1.1443829868,0.8945115328,0.5130836326,0.5119344724,-12.16856667,11.531069827,-3.443438337,-6.272,1.0258383022,1.7882232724,0.5086146608,-13.16209827,4.87429451,-1.023868945,-12.16856667,11.531069827,-3.57097309,-6.272,1.0258383022,2.9377953762,1.6529976477,-12.26758674,5.3873781426,-0.511934472 +050,2,4,31,123,Nebraska,Morrill County,5042,5042,5039,4985,4936,4929,4921,4928,4858,4794,4653,4624,4625,-3,-54,-49,-7,-8,7,-70,-64,-141,-29,1,15,51,56,52,56,59,45,51,47,51,50,22,57,56,61,59,69,68,54,61,47,43,-7,-6,0,-9,-3,-10,-23,-3,-14,4,7,1,-3,0,4,0,2,3,6,2,5,3,3,-45,-51,-2,-5,15,-50,-66,-129,-38,-9,4,-48,-51,2,-5,17,-47,-60,-127,-33,-6,0,0,2,0,0,0,0,-1,0,0,0,82,82,82,81,86,83,81,78,80,78,80,82,10.175578611,11.289184558,10.542321338,11.370558376,11.980911768,9.1968117719,10.567757978,9.9502487562,10.994933707,10.811979673,11.372705507,11.289184558,12.366953877,11.979695431,14.011574779,13.897404455,11.1893908,12.914152641,10.132585965,9.2983025192,-1.197126895,0,-1.824632539,-0.609137056,-2.030663011,-4.700592683,-0.621632822,-2.963903885,0.8623477417,1.5136771543,-0.598563448,0,0.8109477952,0,0.4061326023,0.6131207848,1.2432656444,0.4234148407,1.0779346772,0.6487187804,-8.978451716,-10.28122165,-0.405473898,-1.015228426,3.0459945172,-10.21867975,-13.67592209,-27.31025722,-8.192303546,-1.946156341,-9.577015164,-10.28122165,0.4054738976,-1.015228426,3.4521271195,-9.605558962,-12.43265644,-26.88684238,-7.114368869,-1.297437561 +050,2,4,31,125,Nebraska,Nance County,3735,3735,3740,3732,3675,3559,3528,3574,3562,3558,3492,3482,3532,5,-8,-57,-116,-31,46,-12,-4,-66,-10,50,12,42,52,37,37,39,43,40,37,40,41,5,55,62,36,61,46,49,55,58,44,37,7,-13,-10,1,-24,-7,-6,-15,-21,-4,4,0,0,0,0,4,3,3,0,0,0,0,-1,5,-49,-118,-12,51,-10,11,-46,-5,47,-1,5,-49,-118,-8,54,-7,11,-46,-5,47,-1,0,2,1,1,-1,1,0,1,-1,-1,143,143,143,143,143,143,142,143,143,143,141,142,11.241970021,14.040772242,10.229471938,10.441653732,10.98282174,12.051569507,11.235955056,10.496453901,11.471178664,11.690903906,14.721627409,16.740920751,9.9529997235,17.214618315,12.954097437,13.733183857,15.449438202,16.453900709,12.61829653,10.550327916,-3.479657388,-2.700148508,0.2764722145,-6.772964583,-1.971275697,-1.68161435,-4.213483146,-5.957446809,-1.147117866,1.1405759909,0,0,0,1.1288274305,0.8448324416,0.8408071749,0,0,0,0,1.3383297645,-13.23072769,-32.62372132,-3.386482292,14.362151507,-2.802690583,3.0898876404,-13.04964539,-1.433897333,13.401767893,1.3383297645,-13.23072769,-32.62372132,-2.257654861,15.206983948,-1.961883408,3.0898876404,-13.04964539,-1.433897333,13.401767893 +050,2,4,31,127,Nebraska,Nemaha County,7248,7248,7238,7241,7155,7152,7132,7007,6980,6962,6963,6943,7044,-10,3,-86,-3,-20,-125,-27,-18,1,-20,101,22,68,80,84,71,69,71,82,99,80,78,34,89,97,87,76,76,86,72,83,86,74,-12,-21,-17,-3,-5,-7,-15,10,16,-6,4,0,0,1,1,4,4,7,6,6,3,3,3,24,-71,0,-19,-123,-20,-33,-22,-15,94,3,24,-70,1,-15,-119,-13,-27,-16,-12,97,-1,0,1,-1,0,1,1,-1,1,-2,0,486,486,502,488,527,536,518,491,469,466,464,502,9.3929138753,11.114198388,11.74250367,9.9411929432,9.7602376406,10.152284264,11.763018218,14.219030521,11.505824824,11.153213698,12.29366669,13.475965546,12.161878801,10.641276953,10.750406677,12.297133052,10.328503801,11.921005386,12.368761686,10.581254022,-2.900752814,-2.361767158,-0.419375131,-0.70008401,-0.990169036,-2.144848788,1.4345144169,2.2980251346,-0.862936862,0.5719596768,0,0.1389274799,0.1397917104,0.5600672081,0.5658108777,1.0009294345,0.8607086501,0.8617594255,0.4314684309,0.4289697576,3.3151460736,-9.86385107,0,-2.660319238,-17.39868449,-2.859798384,-4.733897576,-3.15978456,-2.157342154,13.441052406,3.3151460736,-9.72492359,0.1397917104,-2.10025203,-16.83287361,-1.85886895,-3.873188926,-2.298025135,-1.725873724,13.870022163 +050,2,4,31,129,Nebraska,Nuckolls County,4500,4500,4514,4448,4431,4385,4349,4323,4273,4269,4190,4152,4134,14,-66,-17,-46,-36,-26,-50,-4,-79,-38,-18,11,42,37,34,44,51,43,37,46,45,44,5,66,62,67,59,53,64,59,79,48,68,6,-24,-25,-33,-15,-2,-21,-22,-33,-3,-24,0,0,1,2,2,8,11,8,7,5,2,8,-42,8,-14,-22,-32,-40,11,-53,-38,4,8,-42,9,-12,-20,-24,-29,19,-46,-33,6,0,0,-1,-1,-1,0,0,-1,0,-2,0,59,59,59,60,56,54,52,50,46,46,42,46,9.3729078331,8.3342718775,7.7132486388,10.075566751,11.76199262,10.004653327,8.6630765629,10.87599007,10.788779669,10.620323437,14.728855166,13.96553666,15.199637024,13.510419052,12.223247232,14.890646812,13.81409506,18.678330772,11.508031647,16.41322713,-5.355947333,-5.631264782,-7.486388385,-3.434852301,-0.461254613,-4.885993485,-5.151018497,-7.802340702,-0.719251978,-5.792903693,0,0.2252505913,0.4537205082,0.4579803068,1.8450184502,2.5593299209,1.8730976352,1.6550419671,1.1987532966,0.4827419744,-9.372907833,1.8020047303,-3.176043557,-5.037783375,-7.380073801,-9.306654258,2.5755092484,-12.53103204,-9.110525054,0.9654839488,-9.372907833,2.0272553215,-2.722323049,-4.579803068,-5.535055351,-6.747324337,4.4486068836,-10.87599007,-7.911771757,1.4482259232 +050,2,4,31,131,Nebraska,Otoe County,15740,15740,15747,15740,15689,15686,15781,15844,15930,15946,15991,15993,15965,7,-7,-51,-3,95,63,86,16,45,2,-28,52,182,181,198,193,217,195,220,175,193,179,69,185,190,198,175,207,164,176,180,173,172,-17,-3,-9,0,18,10,31,44,-5,20,7,2,25,37,35,42,28,32,38,27,21,16,23,-28,-80,-36,36,29,23,-65,23,-38,-51,25,-3,-43,-1,78,57,55,-27,50,-17,-35,-1,-1,1,-2,-1,-4,0,-1,0,-1,0,338,338,338,334,317,335,335,315,263,266,257,240,11.560326484,11.518024754,12.621513944,12.266819207,13.723320158,12.274186442,13.803488518,10.95907568,12.068534267,11.202202891,11.750881316,12.090744217,12.621513944,11.12276353,13.090909091,10.32290552,11.042790814,11.272192128,10.817908954,10.764127918,-0.190554832,-0.572719463,0,1.1440556774,0.6324110672,1.9512809215,2.7606977036,-0.313116448,1.2506253127,0.4380749734,1.5879569346,2.3545133475,2.2310756972,2.6694632472,1.7707509881,2.0142254674,2.3842389258,1.6908288192,1.3131565783,1.0013142249,-1.778511767,-5.09083967,-2.294820717,2.2881113548,1.8339920949,1.4477245547,-4.078303426,1.4403356608,-2.376188094,-3.191689092,-0.190554832,-2.736326323,-0.06374502,4.957574602,3.604743083,3.461950022,-1.6940645,3.1311644801,-1.063031516,-2.190374867 +050,2,4,31,133,Nebraska,Pawnee County,2773,2773,2781,2791,2793,2752,2728,2693,2704,2624,2632,2639,2601,8,10,2,-41,-24,-35,11,-80,8,7,-38,1,25,24,34,28,34,39,33,32,36,37,6,38,36,43,45,32,38,34,45,23,33,-5,-13,-12,-9,-17,2,1,-1,-13,13,4,0,0,0,0,0,0,0,0,0,0,0,13,24,15,-34,-5,-38,10,-79,20,-5,-40,13,24,15,-34,-5,-38,10,-79,20,-5,-40,0,-1,-1,2,-2,1,0,0,1,-1,-2,39,39,39,38,36,35,38,38,39,40,40,31,8.9734386217,8.5959885387,12.263300271,10.218978102,12.543811105,14.452473596,12.387387387,12.176560122,13.659647126,14.122137405,13.639626705,12.893982808,15.509467989,16.423357664,11.805939863,14.08189735,12.762762763,17.123287671,8.7269967748,12.595419847,-4.666188083,-4.297994269,-3.246167719,-6.204379562,0.7378712415,0.3705762461,-0.375375375,-4.946727549,4.932650351,1.5267175573,0,0,0,0,0,0,0,0,0,0,8.6145010768,5.3724928367,-12.26330027,-1.824817518,-14.01955359,3.7057624606,-29.65465465,7.6103500761,-1.897173212,-15.26717557,8.6145010768,5.3724928367,-12.26330027,-1.824817518,-14.01955359,3.7057624606,-29.65465465,7.6103500761,-1.897173212,-15.26717557 +050,2,4,31,135,Nebraska,Perkins County,2970,2967,2978,2944,2929,2890,2874,2933,2898,2885,2911,2884,2867,11,-34,-15,-39,-16,59,-35,-13,26,-27,-17,6,34,33,36,44,45,46,37,35,28,29,3,33,32,35,34,44,28,32,31,36,27,3,1,1,1,10,1,18,5,4,-8,2,0,0,0,1,0,0,1,1,0,0,0,8,-35,-16,-42,-28,57,-53,-19,22,-19,-18,8,-35,-16,-41,-28,57,-52,-18,22,-19,-18,0,0,0,1,2,1,-1,0,0,0,-1,44,44,44,42,40,40,34,35,31,35,31,30,11.482607227,11.23786821,12.37326001,15.267175573,15.498536249,15.777739667,12.796126578,12.077294686,9.6635030198,10.085202573,11.144883485,10.89732675,12.029558343,11.797362942,15.154124333,9.6038415366,11.066920284,10.697032436,12.424503883,9.3896713615,0.337723742,0.3405414609,0.343701667,3.4698126301,0.3444119167,6.1738981307,1.7292062943,1.3802622498,-2.761000863,0.695531212,0,0,0.343701667,0,0,0.3429943406,0.3458412589,0,0,0,-11.82033097,-5.448663375,-14.43547001,-9.715475364,19.631479249,-18.17870005,-6.570983918,7.5914423741,-6.557377049,-6.259780908,-11.82033097,-5.448663375,-14.09176835,-9.715475364,19.631479249,-17.83570571,-6.22514266,7.5914423741,-6.557377049,-6.259780908 +050,2,4,31,137,Nebraska,Phelps County,9188,9188,9183,9141,9208,9179,9162,9218,9199,9052,9003,8991,9006,-5,-42,67,-29,-17,56,-19,-147,-49,-12,15,22,113,131,106,113,120,112,119,107,115,115,33,131,111,114,100,114,113,137,101,105,100,-11,-18,20,-8,13,6,-1,-18,6,10,15,0,0,3,3,3,4,7,8,7,5,7,7,-24,45,-23,-31,48,-24,-137,-63,-27,-6,7,-24,48,-20,-28,52,-17,-129,-56,-22,1,-1,0,-1,-1,-2,-2,-1,0,1,0,-1,249,249,249,243,248,250,258,254,251,239,246,244,12.333551626,14.278707287,11.529885245,12.322119841,13.057671382,12.162675789,13.040381349,11.85267239,12.782038457,12.779907762,14.298188169,12.098751976,12.400065264,10.904530833,12.404787813,12.271271108,15.012876007,11.188036555,11.670556852,11.112963272,-1.964636542,2.1799553109,-0.870180018,1.4175890082,0.6528835691,-0.10859532,-1.972494658,0.6646358349,1.111481605,1.6669444907,0,0.3269932966,0.3263175069,0.327135925,0.4352557127,0.7601672368,0.8766642924,0.7754084741,0.5557408025,0.777907429,-2.61951539,4.9048994496,-2.501767553,-3.380404558,5.2230685528,-2.606287669,-15.01287601,-6.978676267,-3.001000333,-0.666777796,-2.61951539,5.2318927462,-2.175450046,-3.053268633,5.6583242655,-1.846120432,-14.13621171,-6.203267793,-2.445259531,0.1111296327 +050,2,4,31,139,Nebraska,Pierce County,7266,7266,7259,7192,7183,7176,7200,7188,7134,7091,7117,7136,7184,-7,-67,-9,-7,24,-12,-54,-43,26,19,48,19,69,77,90,81,97,89,86,82,99,92,10,53,69,84,69,95,61,79,78,53,70,9,16,8,6,12,2,28,7,4,46,22,1,2,1,3,1,1,2,0,0,0,1,-19,-85,-17,-15,12,-14,-85,-51,23,-26,25,-18,-83,-16,-12,13,-13,-83,-51,23,-26,26,2,0,-1,-1,-1,-1,1,1,-1,-1,0,116,116,116,116,112,106,106,95,92,90,103,108,9.5495121445,10.713043478,12.535691901,11.268781302,13.483458438,12.428431783,12.091388401,11.542792793,13.89181225,12.849162011,7.3351325168,9.6,11.699979107,9.5993322204,13.205448985,8.5183633571,11.107205624,10.97972973,7.4370308005,9.7765363128,2.2143796277,1.1130434783,0.8357127934,1.6694490818,0.2780094523,3.9100684262,0.9841827768,0.5630630631,6.4547814495,3.0726256983,0.2767974535,0.1391304348,0.4178563967,0.1391207568,0.1390047262,0.2792906019,0,0,0,0.1396648045,-11.76389177,-2.365217391,-2.089281983,1.6694490818,-1.946066166,-11.86985058,-7.170474517,3.2376126126,-3.648354732,3.4916201117,-11.48709432,-2.226086957,-1.671425587,1.8085698386,-1.80706144,-11.59055998,-7.170474517,3.2376126126,-3.648354732,3.6312849162 +050,2,4,31,141,Nebraska,Platte County,32237,32237,32305,32518,32672,32598,32744,32869,32986,33226,33259,33413,33364,68,213,154,-74,146,125,117,240,33,154,-49,139,454,486,482,476,506,485,483,463,467,459,48,289,245,274,297,274,289,292,309,283,298,91,165,241,208,179,232,196,191,154,184,161,4,19,30,33,65,73,111,108,81,53,50,-27,30,-113,-321,-96,-180,-189,-59,-202,-83,-260,-23,49,-83,-288,-31,-107,-78,49,-121,-30,-210,0,-1,-4,6,-2,0,-1,0,0,0,0,476,476,476,481,422,470,483,475,465,454,471,439,14.007373926,14.91026231,14.769419335,14.569495883,15.423772728,14.729329588,14.589500393,13.927953674,14.00887929,13.747248304,8.916588248,7.5164902592,8.3958939789,9.0906308347,8.352003414,8.7768582492,8.8201534465,9.2953297736,8.4893208543,8.9252287464,5.0907856779,7.3937720509,6.3735253562,5.4788650485,7.071769314,5.9524713385,5.7693469462,4.6326239001,5.5195584353,4.8220195576,0.5862116841,0.9203865624,1.0111843113,1.9895320009,2.2251687928,3.3710424417,3.262248535,2.4366398436,1.5898728102,1.4975216017,0.925597396,-3.466789385,-9.836065574,-2.938385724,-5.486717571,-5.739883076,-1.782154292,-6.076558622,-2.489800816,-7.787112329,1.5118090801,-2.546402823,-8.824881262,-0.948853723,-3.261548778,-2.368840635,1.4800942427,-3.639918779,-0.899928006,-6.289590727 +050,2,4,31,143,Nebraska,Polk County,5406,5402,5394,5336,5265,5241,5267,5169,5182,5299,5200,5154,5201,-8,-58,-71,-24,26,-98,13,117,-99,-46,47,8,56,43,54,62,39,55,62,56,62,57,11,68,74,72,67,58,52,64,62,57,61,-3,-12,-31,-18,-5,-19,3,-2,-6,5,-4,0,2,2,6,12,4,1,2,1,-1,0,-5,-47,-44,-11,21,-84,9,118,-94,-50,53,-5,-45,-42,-5,33,-80,10,120,-93,-51,53,0,-1,2,-1,-2,1,0,-1,0,0,-2,124,124,124,121,115,115,109,105,114,111,105,96,10.438024231,8.1124422224,10.279840091,11.800532927,7.4741280184,10.626992561,11.830932163,10.667682636,11.976047904,11.009174312,12.674743709,13.96094708,13.706453455,12.752188809,11.115369874,10.047338421,12.212575136,11.810648633,11.010237589,11.781747948,-2.236719478,-5.848504858,-3.426613364,-0.951655881,-3.641241855,0.5796541397,-0.381642973,-1.142965997,0.9658103149,-0.772573636,0.3727865797,0.3773228941,1.1422044546,2.283974115,0.7665772327,0.1932180466,0.381642973,0.1904943328,-0.193162063,0,-8.760484623,-8.301103669,-2.0940415,3.9969547012,-16.09812189,1.7389624191,22.516935407,-17.90646728,-9.658103149,10.236600676,-8.387698043,-7.923780775,-0.951837045,6.2809288161,-15.33154465,1.9321804657,22.89857838,-17.71597295,-9.851265212,10.236600676 +050,2,4,31,145,Nebraska,Red Willow County,11055,11055,11059,11051,11047,11057,10909,10895,10782,10765,10732,10720,10627,4,-8,-4,10,-148,-14,-113,-17,-33,-12,-93,29,140,120,122,128,120,137,151,130,131,133,18,126,113,114,125,125,143,121,136,138,134,11,14,7,8,3,-5,-6,30,-6,-7,-1,1,2,1,3,14,8,7,6,4,2,2,-9,-23,-11,1,-169,-16,-113,-53,-28,-8,-93,-8,-21,-10,4,-155,-8,-106,-47,-24,-6,-91,1,-1,-1,-2,4,-1,-1,0,-3,1,-1,369,369,371,368,371,372,365,395,396,429,416,423,12.663952962,10.860711377,11.038726022,11.654374943,11.007154651,12.640125479,14.015872279,12.09471089,12.213313444,12.460767321,11.397557666,10.22716988,10.314875136,11.38122553,11.465786094,13.193707616,11.231261893,12.652928316,12.865933246,12.554457301,1.2663952962,0.633541497,0.7238508867,0.2731494127,-0.458631444,-0.553582138,2.7846103866,-0.558217426,-0.652619802,-0.09368998,0.1809136137,0.0905059281,0.2714440825,1.2746972594,0.73381031,0.6458458274,0.5569220773,0.3721449505,0.1864628007,0.1873799597,-2.080506558,-0.99556521,0.0904813608,-15.38741692,-1.46762062,-10.42579693,-4.91947835,-2.605014653,-0.745851203,-8.713168127,-1.899592944,-0.905059281,0.3619254434,-14.11271966,-0.73381031,-9.7799511,-4.362556272,-2.232869703,-0.559388402,-8.525788167 +050,2,4,31,147,Nebraska,Richardson County,8363,8363,8372,8341,8285,8134,8112,8026,8013,7980,7927,7854,7791,9,-31,-56,-151,-22,-86,-13,-33,-53,-73,-63,31,86,88,85,118,90,83,80,85,90,86,16,108,120,128,110,134,110,123,115,111,116,15,-22,-32,-43,8,-44,-27,-43,-30,-21,-30,0,0,0,-1,-1,-1,4,3,1,0,1,-5,-7,-24,-106,-28,-42,11,5,-24,-51,-34,-5,-7,-24,-107,-29,-43,15,8,-23,-51,-33,-1,-2,0,-1,-1,1,-1,2,0,-1,0,155,155,155,154,153,151,151,151,158,148,145,129,10.291389936,10.585829424,10.353858335,14.526652715,11.153798488,10.34977243,10.004376915,10.687118878,11.406121285,10.993927772,12.924071082,14.435221942,15.591692551,13.541794903,16.606766638,13.716565871,15.381729507,14.459043189,14.067549585,14.829018856,-2.632681146,-3.849392518,-5.237834216,0.9848578112,-5.45296815,-3.366793441,-5.377352592,-3.77192431,-2.6614283,-3.835091083,0,0,-0.121810098,-0.123107226,-0.123931094,0.4987842135,0.3751641343,0.1257308103,0,0.1278363694,-0.837671274,-2.887044388,-12.91187039,-3.447002339,-5.205105961,1.3716565871,0.6252735572,-3.017539448,-6.463468728,-4.346436561,-0.837671274,-2.887044388,-13.03368049,-3.570109565,-5.329037055,1.8704408005,1.0004376915,-2.891808638,-6.463468728,-4.218600192 +050,2,4,31,149,Nebraska,Rock County,1526,1528,1524,1480,1426,1440,1449,1417,1405,1419,1354,1370,1377,-4,-44,-54,14,9,-32,-12,14,-65,16,7,1,14,13,15,14,12,21,18,13,14,17,3,18,28,19,18,34,29,26,19,19,14,-2,-4,-15,-4,-4,-22,-8,-8,-6,-5,3,0,0,0,0,0,0,0,0,0,0,0,-2,-39,-40,17,14,-11,-4,21,-59,21,5,-2,-39,-40,17,14,-11,-4,21,-59,21,5,0,-1,1,1,-1,1,0,1,0,0,-1,30,30,30,28,24,29,29,31,29,27,26,22,9.3209054594,8.9470061941,10.467550593,9.6919349256,8.3740404745,14.883061658,12.747875354,9.3761269383,10.279001468,12.377138697,11.984021305,19.27047488,13.258897418,12.46105919,23.726448011,20.552799433,18.413597734,13.703570141,13.950073421,10.19293775,-2.663115846,-10.32346869,-2.791346825,-2.769124264,-15.35240754,-5.669737775,-5.66572238,-4.327443202,-3.671071953,2.1842009465,0,0,0,0,0,0,0,0,0,0,-25.96537949,-27.52924983,11.863224006,9.6919349256,-7.676203768,-2.834868887,14.872521246,-42.55319149,15.418502203,3.6403349108,-25.96537949,-27.52924983,11.863224006,9.6919349256,-7.676203768,-2.834868887,14.872521246,-42.55319149,15.418502203,3.6403349108 +050,2,4,31,151,Nebraska,Saline County,14200,14200,14220,14324,14412,14294,14291,14193,14228,14368,14327,14194,13987,20,104,88,-118,-3,-98,35,140,-41,-133,-207,46,204,194,182,183,191,187,201,177,193,188,27,132,158,149,136,140,156,157,152,111,132,19,72,36,33,47,51,31,44,25,82,56,9,31,55,64,103,58,99,90,51,52,44,-7,3,-1,-220,-155,-210,-96,7,-118,-268,-305,2,34,54,-156,-52,-152,3,97,-67,-216,-261,-1,-2,-2,5,2,3,1,-1,1,1,-2,1038,1038,1038,1066,1071,1057,1024,1008,1049,958,877,846,14.293721973,13.502227171,12.680275901,12.803918139,13.411037776,13.159283628,14.057910197,12.336644015,13.533887311,13.342322842,9.2488789238,10.996659243,10.381104995,9.5154801469,9.8300800449,10.977798107,10.980556721,10.594180171,7.7837382981,9.3680139101,5.0448430493,2.5055679287,2.299170905,3.288437992,3.5809577307,2.1814855213,3.077353476,1.7424638439,5.750149013,3.9743089315,2.1720852018,3.8279510022,4.4589981189,7.206576876,4.0724617329,6.9666795679,6.2945866555,3.5546262415,3.6464359595,3.1226713034,0.2102017937,-0.069599109,-15.32780603,-10.8448487,-14.74512007,-6.755568066,0.4895789621,-8.224429343,-18.79316994,-21.64578972,2.3822869955,3.7583518931,-10.86880791,-3.638271821,-10.67265833,0.2111115021,6.7841656176,-4.669803102,-15.14673399,-18.52311841 +050,2,4,31,153,Nebraska,Sarpy County,158840,158837,159732,162597,165710,169064,171942,175294,178457,181468,184106,186893,188856,895,2865,3113,3354,2878,3352,3163,3011,2638,2787,1963,629,2592,2610,2521,2615,2576,2527,2490,2530,2479,2458,142,787,798,877,934,920,883,1060,1016,1086,1186,487,1805,1812,1644,1681,1656,1644,1430,1514,1393,1272,89,121,532,299,412,352,289,166,52,50,47,302,939,791,1417,807,1346,1232,1418,1073,1345,632,391,1060,1323,1716,1219,1698,1521,1584,1125,1395,679,17,0,-22,-6,-22,-2,-2,-3,-1,-1,12,1277,1275,1279,1100,1116,1064,1240,1300,1270,1278,1113,1101,16.082946306,15.899752366,15.060906761,15.336973543,14.837171261,14.286885408,13.836215878,13.841246916,13.363917423,13.083201818,4.8832093916,4.8613035969,5.2393555055,5.4779094796,5.2989897361,4.9922120361,5.8901159964,5.5583821607,5.8544632196,6.3127247178,11.199736915,11.038448769,9.8215512555,9.8590640634,9.538181525,9.2946733719,7.9460998819,8.2828647552,7.5094542034,6.7704771004,0.7507856879,3.2408690646,1.7862796991,2.4163797704,2.0274395512,1.6339176426,0.9224143919,0.2844841263,0.2695425055,0.2501669998,5.8263451318,4.8186605829,8.4654124872,4.7330545504,7.7526523748,6.9653513347,7.8794193235,5.8702205299,7.2506933981,3.3639477417,6.5771308198,8.0595296476,10.251692186,7.1494343208,9.780091926,8.5992689773,8.8018337154,6.1547046562,7.5202359036,3.6141147415 +050,2,4,31,155,Nebraska,Saunders County,20780,20778,20867,20839,20799,20878,20863,20953,20977,21035,21280,21562,21927,89,-28,-40,79,-15,90,24,58,245,282,365,68,269,235,234,218,245,237,267,258,238,248,33,193,174,190,213,202,225,208,238,217,216,35,76,61,44,5,43,12,59,20,21,32,3,11,11,9,5,4,8,5,5,3,4,49,-115,-115,29,-23,48,4,-6,222,258,332,52,-104,-104,38,-18,52,12,-1,227,261,336,2,0,3,-3,-2,-5,0,0,-2,0,-3,335,335,335,337,336,337,341,335,336,342,342,345,12.899822567,11.287765983,11.229215155,10.445365468,11.718002678,11.304555211,12.710654099,12.194257356,11.110592409,11.40518292,9.2552630317,8.3577501321,9.1177388008,10.205792866,9.6613736369,10.732172669,9.9019327811,11.248966088,10.13024602,9.933546414,3.6445595358,2.9300158509,2.1114763539,0.2395726025,2.0566290415,0.5723825423,2.8087213177,0.9452912679,0.9803463891,1.4716365058,0.5275020381,0.5283635141,0.4318928906,0.2395726025,0.1913143294,0.3815883616,0.2380272303,0.236322817,0.1400494842,0.1839545632,-5.514794034,-5.523800375,1.3916548696,-1.102033971,2.2957719533,0.1907941808,-0.285632676,10.492733073,12.044255637,15.268228747,-4.987291996,-4.995436861,1.8235477602,-0.862461369,2.4870862828,0.5723825423,-0.047605446,10.72905589,12.184305121,15.452183311 +050,2,4,31,157,Nebraska,Scotts Bluff County,36970,36972,37058,36965,36923,36878,36467,36273,36439,36175,35923,35582,35299,86,-93,-42,-45,-411,-194,166,-264,-252,-341,-283,151,531,467,502,472,473,485,507,449,448,419,113,442,414,434,386,393,444,403,420,413,449,38,89,53,68,86,80,41,104,29,35,-30,4,-7,7,36,34,33,38,22,9,10,11,44,-173,-97,-147,-543,-306,89,-389,-291,-386,-263,48,-180,-90,-111,-509,-273,127,-367,-282,-376,-252,0,-2,-5,-2,12,-1,-2,-1,1,0,-1,847,847,847,854,860,862,877,868,859,864,849,764,14.346892182,12.640753573,13.604151705,12.870679665,13.005224086,13.340301463,13.964249318,12.455269217,12.530592266,11.822632299,11.94223417,11.206149848,11.761358247,10.5255982,10.805609018,12.212564639,11.09978792,11.650808622,11.551639745,12.669121485,2.4046580117,1.4346037246,1.8427934581,2.3450814643,2.1996150674,1.1277368247,2.8644613986,0.8044605953,0.9789525208,-0.846489186,-0.189130405,0.1894759636,0.9755965366,0.9271252301,0.9073412153,1.0452194961,0.6059437574,0.2496601847,0.2797007202,0.3103793682,-4.674222877,-2.625595496,-3.983685858,-14.80673529,-8.413527633,2.448014083,-10.71418735,-8.072345974,-10.7964478,-7.420888531,-4.863353282,-2.436119532,-3.008089321,-13.87961006,-7.506186417,3.4932335791,-10.10824359,-7.822685789,-10.51674708,-7.110509163 +050,2,4,31,159,Nebraska,Seward County,16750,16750,16800,16707,16899,16997,17016,16998,17095,17204,17281,17318,17186,50,-93,192,98,19,-18,97,109,77,37,-132,59,207,206,180,187,204,166,203,169,193,187,48,177,153,164,147,192,186,167,184,165,159,11,30,53,16,40,12,-20,36,-15,28,28,-1,2,5,11,17,15,17,13,17,3,4,39,-126,134,73,-36,-44,101,61,75,6,-163,38,-124,139,84,-19,-29,118,74,92,9,-159,1,1,0,-2,-2,-1,-1,-1,0,0,-1,1296,1296,1313,1346,1379,1302,1287,1367,1394,1323,1343,1234,12.355627182,12.259715527,10.620722209,10.995795725,11.995060857,9.7380693984,11.837079798,9.8013629114,11.156391803,10.839322977,10.564956576,9.105516872,9.6766580127,8.6437538588,11.289469042,10.911330772,9.737893233,10.671306365,9.5378479147,9.2163227452,1.7906706061,3.154198655,0.9440641964,2.3520418663,0.7055918151,-1.173261373,2.0991865652,-0.869943454,1.6185438886,1.6230002319,0.1193780404,0.2975659108,0.649044135,0.9996177932,0.8819897689,0.9972721673,0.758039593,0.9859359142,0.1734154166,0.231857176,-7.520816546,7.9747664108,4.3072928959,-2.11683768,-2.587169989,5.9249699352,3.5569550133,4.3497172684,0.3468308333,-9.448179921,-7.401438505,8.2723323216,4.9563370309,-1.117219887,-1.70518022,6.9222421025,4.3149946063,5.3356531825,0.5202462499,-9.216322745 +050,2,4,31,161,Nebraska,Sheridan County,5469,5469,5443,5361,5330,5213,5254,5220,5238,5281,5175,5229,5150,-26,-82,-31,-117,41,-34,18,43,-106,54,-79,14,54,67,48,68,51,52,68,60,61,63,28,65,71,79,71,82,64,82,91,65,67,-14,-11,-4,-31,-3,-31,-12,-14,-31,-4,-4,0,1,1,0,0,4,9,9,6,3,4,-12,-71,-28,-87,44,-8,23,49,-81,55,-78,-12,-70,-27,-87,44,-4,32,58,-75,58,-74,0,-1,0,1,0,1,-2,-1,0,0,-1,113,113,113,110,107,103,105,110,121,136,142,144,9.9962976675,12.533907025,9.1055676752,12.993216777,9.7383998472,9.944540065,12.928985645,11.476664116,11.726259131,12.139897871,12.032580526,13.282199981,14.986246799,13.566446928,15.657819362,12.239433926,15.590835631,17.40627391,12.495194156,12.910685037,-2.036282858,-0.748292957,-5.880679124,-0.573230152,-5.919419515,-2.294893861,-2.661849986,-5.929609793,-0.768935025,-0.770787166,0.1851166235,0.1870732392,0,0,0.7637960665,1.7211703959,1.7111892765,1.1476664116,0.5767012687,0.7707871664,-13.14328027,-5.238050697,-16.50384141,8.4073755613,-1.527592133,4.3985465672,9.3164749501,-15.49349656,10.572856594,-15.03034974,-12.95816364,-5.050977458,-16.50384141,8.4073755613,-0.763796066,6.1197169631,11.027664227,-14.34583015,11.149557862,-14.25956258 +050,2,4,31,163,Nebraska,Sherman County,3152,3152,3165,3103,3079,3062,3034,3036,3006,3072,3029,2984,2986,13,-62,-24,-17,-28,2,-30,66,-43,-45,2,8,33,28,29,32,25,25,33,48,34,35,3,48,34,43,28,45,49,32,42,30,43,5,-15,-6,-14,4,-20,-24,1,6,4,-8,0,0,0,0,0,0,0,0,0,0,0,7,-46,-17,-4,-32,24,-6,64,-50,-49,9,7,-46,-17,-4,-32,24,-6,64,-50,-49,9,1,-1,-1,1,0,-2,0,1,1,0,1,56,56,56,55,56,53,55,55,53,53,56,55,10.529674537,9.0585571013,9.4447158443,10.498687664,8.23723229,8.2754054949,10.858835143,15.735125389,11.308830866,11.725293132,15.315890236,10.99967648,14.004233838,9.186351706,14.827018122,16.21979477,10.529779533,13.768234716,9.9783801763,14.405360134,-4.786215699,-1.941119379,-4.559517994,1.312335958,-6.589785832,-7.944389275,0.3290556104,1.9668906737,1.3304506902,-2.680067002,0,0,0,0,0,0,0,0,0,0,-14.67772814,-5.49983824,-1.302719427,-10.49868766,7.9077429984,-1.986097319,21.059559065,-16.39075561,-16.29802095,3.0150753769,-14.67772814,-5.49983824,-1.302719427,-10.49868766,7.9077429984,-1.986097319,21.059559065,-16.39075561,-16.29802095,3.0150753769 +050,2,4,31,165,Nebraska,Sioux County,1311,1307,1307,1314,1319,1326,1317,1272,1256,1194,1181,1158,1200,0,7,5,7,-9,-45,-16,-62,-13,-23,42,2,9,9,12,9,8,9,6,16,9,7,1,8,4,8,10,11,8,8,5,6,2,1,1,5,4,-1,-3,1,-2,11,3,5,0,0,0,0,0,0,0,0,0,0,0,-1,7,0,2,-8,-42,-19,-60,-25,-24,37,-1,7,0,2,-8,-42,-19,-60,-25,-24,37,0,-1,0,1,0,0,2,0,1,-2,0,0,0,0,0,0,0,0,0,0,0,0,0,6.8676077833,6.8363083935,9.0737240076,6.8104426788,6.179992275,7.1202531646,4.8979591837,13.473684211,7.6955964087,5.9372349449,6.1045402518,3.038359286,6.0491493384,7.567158532,8.4974893781,6.3291139241,6.5306122449,4.2105263158,5.1303976058,1.6963528414,0.7630675315,3.7979491075,3.0245746692,-0.756715853,-2.317497103,0.7911392405,-1.632653061,9.2631578947,2.5651988029,4.2408821035,0,0,0,0,0,0,0,0,0,0,5.3414727203,0,1.5122873346,-6.053726826,-32.44495944,-15.03164557,-48.97959184,-21.05263158,-20.52159042,31.382527566,5.3414727203,0,1.5122873346,-6.053726826,-32.44495944,-15.03164557,-48.97959184,-21.05263158,-20.52159042,31.382527566 +050,2,4,31,167,Nebraska,Stanton County,6129,6128,6141,6176,6092,6089,6099,5946,5972,5978,5969,5932,5880,13,35,-84,-3,10,-153,26,6,-9,-37,-52,25,85,80,59,75,73,59,75,77,78,79,2,48,50,55,38,47,46,38,48,36,41,23,37,30,4,37,26,13,37,29,42,38,0,6,4,3,5,4,6,4,3,2,3,-11,-7,-121,-10,-31,-185,9,-37,-41,-80,-94,-11,-1,-117,-7,-26,-181,15,-33,-38,-78,-91,1,-1,3,0,-1,2,-2,2,0,-1,1,0,0,0,0,3,1,0,1,3,0,3,0,13.80206219,13.042060646,9.6872177982,12.307187397,12.121212121,9.900990099,12.552301255,12.890265339,13.108142173,13.376227565,7.7941057076,8.1512879035,9.0304572695,6.2356416147,7.804068078,7.7194160094,6.359832636,8.0354900812,6.0499117721,6.942092787,6.0079564829,4.8907727421,0.6567605287,6.0715457827,4.3171440432,2.1815740896,6.1924686192,4.8547752574,7.0582304008,6.4341347782,0.9742632134,0.6521030323,0.4925703965,0.8204791598,0.6641760066,1.0068803491,0.6694560669,0.5022181301,0.3361062096,0.5079580088,-1.136640416,-19.72611673,-1.641901322,-5.086970791,-30.71814031,1.5103205236,-6.192468619,-6.863647778,-13.44424838,-15.91601761,-0.162377202,-19.07401369,-1.149330925,-4.266491631,-30.0539643,2.5172008726,-5.523012552,-6.361429648,-13.10814217,-15.4080596 +050,2,4,31,169,Nebraska,Thayer County,5228,5228,5234,5169,5143,5178,5212,5129,5087,5035,5017,4976,4887,6,-65,-26,35,34,-83,-42,-52,-18,-41,-89,11,52,49,61,69,53,59,56,42,48,49,6,76,72,92,81,77,81,82,81,73,80,5,-24,-23,-31,-12,-24,-22,-26,-39,-25,-31,0,1,0,0,0,1,2,0,0,0,0,2,-41,-4,65,46,-61,-22,-26,21,-15,-57,2,-40,-4,65,46,-60,-20,-26,21,-15,-57,-1,-1,1,1,0,1,0,0,0,-1,-1,156,156,156,150,146,133,120,150,133,120,92,66,9.9971162165,9.5034910784,11.820560023,13.282001925,10.250459337,11.550509005,11.065006916,8.356545961,9.6067247073,9.9361249113,14.611169855,13.964313421,17.827729871,15.591915303,14.892176772,15.857478465,16.202331555,16.116195782,14.610227159,16.222244753,-4.614053638,-4.460822343,-6.007169848,-2.309913378,-4.641717435,-4.30696946,-5.137324639,-7.759649821,-5.003502452,-6.286119842,0.1922522349,0,0,0,0.1934048931,0.3915426782,0,0,0,0,-7.882341632,-0.77579519,12.595678713,8.85466795,-11.79769848,-4.30696946,-5.137324639,4.1782729805,-3.002101471,-11.55834939,-7.690089397,-0.77579519,12.595678713,8.85466795,-11.60429359,-3.915426782,-5.137324639,4.1782729805,-3.002101471,-11.55834939 +050,2,4,31,171,Nebraska,Thomas County,647,647,647,697,700,704,700,692,719,720,711,723,739,0,50,3,4,-4,-8,27,1,-9,12,16,3,13,5,11,7,5,5,10,6,7,6,0,10,8,4,3,4,3,8,2,2,1,3,3,-3,7,4,1,2,2,4,5,5,0,2,2,1,1,1,1,1,1,0,1,-4,45,5,-4,-8,-9,23,-2,-13,6,10,-4,47,7,-3,-7,-8,24,-1,-12,6,11,1,0,-1,0,-1,-1,1,0,-1,1,0,2,2,2,2,2,2,2,2,2,2,2,2,19.345238095,7.1581961346,15.66951567,9.9715099715,7.183908046,7.0871722183,13.898540653,8.3857442348,9.7629009763,8.2079343365,14.880952381,11.453113815,5.698005698,4.2735042735,5.7471264368,4.252303331,11.118832523,2.7952480783,2.7894002789,1.3679890561,4.4642857143,-4.294917681,9.9715099715,5.698005698,1.4367816092,2.8348688873,2.7797081306,5.5904961565,6.9735006974,6.8399452804,2.9761904762,2.8632784538,1.4245014245,1.4245014245,1.4367816092,1.4174344437,1.3898540653,1.3976240391,0,1.3679890561,66.964285714,7.1581961346,-5.698005698,-11.3960114,-12.93103448,32.600992204,-2.779708131,-18.16911251,8.3682008368,13.679890561,69.94047619,10.021474588,-4.273504274,-9.971509972,-11.49425287,34.018426648,-1.389854065,-16.77148847,8.3682008368,15.047879617 +050,2,4,31,173,Nebraska,Thurston County,6940,6939,6971,6908,6931,6878,6967,7077,7141,7201,7296,7234,7220,32,-63,23,-53,89,110,64,60,95,-62,-14,41,138,137,132,162,165,164,143,166,143,138,19,78,55,77,78,76,85,85,73,96,93,22,60,82,55,84,89,79,58,93,47,45,0,4,0,3,7,5,5,4,4,3,0,11,-128,-62,-113,0,15,-20,-1,-2,-111,-60,11,-124,-62,-110,7,20,-15,3,2,-108,-60,-1,1,3,2,-2,1,0,-1,0,-1,1,58,58,58,57,57,57,58,45,44,47,52,52,19.886158945,19.799118433,19.117966544,23.401950163,23.497579037,23.069348713,19.941430763,22.901289922,19.683413627,19.095060191,11.240002882,7.9485511959,11.15214715,11.267605634,10.823127314,11.956674638,11.853298006,10.071049183,13.214039917,12.868410129,8.6461560631,11.850567238,7.9658193931,12.134344529,12.674451723,11.112674075,8.0881327569,12.830240739,6.4693737096,6.2266500623,0.5764104042,0,0.4344992396,1.0111953774,0.7120478496,0.7033338022,0.5578022591,0.5518383114,0.4129387474,0,-18.44513293,-8.960184984,-16.36613803,0,2.1361435488,-2.813335209,-0.139450565,-0.275919156,-15.27873365,-8.302200083,-17.86872253,-8.960184984,-15.93163879,1.0111953774,2.8481913985,-2.110001407,0.4183516943,0.2759191557,-14.86579491,-8.302200083 +050,2,4,31,175,Nebraska,Valley County,4260,4262,4267,4227,4216,4181,4217,4167,4191,4214,4175,4117,4103,5,-40,-11,-35,36,-50,24,23,-39,-58,-14,14,55,48,48,58,52,43,48,47,50,49,15,58,57,56,63,48,50,57,49,51,57,-1,-3,-9,-8,-5,4,-7,-9,-2,-1,-8,0,-1,0,1,11,8,7,6,6,4,1,6,-36,-1,-28,30,-63,24,27,-44,-61,-8,6,-37,-1,-27,41,-55,31,33,-38,-57,-7,0,0,-1,0,0,1,0,-1,1,0,1,49,49,49,49,39,38,37,45,42,42,42,38,12.950317871,11.370365984,11.432654519,13.812812574,12.404580153,10.289542953,11.421772754,11.205149601,12.059816691,11.922141119,13.656698846,13.502309606,13.338096939,15.003572279,11.450381679,11.964584829,13.563355146,11.681964477,12.301013025,13.868613139,-0.706380975,-2.131943622,-1.90544242,-1.190759705,0.9541984733,-1.675041876,-2.141582391,-0.476814877,-0.241196334,-1.946472019,-0.235460325,0,0.2381803025,2.6196713503,1.9083969466,1.675041876,1.4277215943,1.4304446299,0.9647853353,0.2433090024,-8.476571698,-0.236882625,-6.66904847,7.1445582281,-15.02862595,5.7430007179,6.4247471743,-10.48992729,-14.71297636,-1.946472019,-8.712032023,-0.236882625,-6.430868167,9.7642295785,-13.12022901,7.4180425939,7.8524687686,-9.059482656,-13.74819103,-1.703163017 +050,2,4,31,177,Nebraska,Washington County,20234,20232,19921,19920,19951,19855,19935,19925,20217,20330,20599,20683,20901,-311,-1,31,-96,80,-10,292,113,269,84,218,54,196,207,200,236,224,213,215,205,203,204,28,164,152,190,169,188,179,186,199,174,191,26,32,55,10,67,36,34,29,6,29,13,0,1,3,9,17,13,15,12,12,9,2,-381,-34,-29,-114,-2,-60,245,74,252,48,203,-381,-33,-26,-105,15,-47,260,86,264,57,205,44,0,2,-1,-2,1,-2,-2,-1,-2,0,535,178,178,176,168,168,172,172,147,143,134,137,9.8391104641,10.383486745,10.048736371,11.862276954,11.239337682,10.612326242,10.60497694,10.017347113,9.8347948258,9.8114659484,8.2327250822,7.6245893005,9.5462995528,8.4945966323,9.4330155544,8.9183398934,9.1745381902,9.7241564661,8.4298241364,9.1862254713,1.6063853819,2.7588974443,0.5024368186,3.3676803217,1.8063221274,1.6939863485,1.4304387501,0.2931906472,1.4049706894,0.6252404771,0.0501995432,0.1504853151,0.4521931367,0.8544860518,0.6522829905,0.7473469184,0.5919056897,0.5863812944,0.4360253864,0.0961908426,-1.706784468,-1.45469138,-5.727779732,-0.100527771,-3.010536879,12.206666335,3.6500850864,12.314007183,2.3254687273,9.7633705271,-1.656584925,-1.304206065,-5.275586595,0.753958281,-2.358253889,12.954013253,4.2419907761,12.900388478,2.7614941137,9.8595613698 +050,2,4,31,179,Nebraska,Wayne County,9595,9592,9610,9456,9507,9448,9412,9375,9427,9260,9346,9413,9492,18,-154,51,-59,-36,-37,52,-167,86,67,79,30,110,90,112,85,98,125,85,101,88,90,23,67,72,64,46,61,69,59,78,62,55,7,43,18,48,39,37,56,26,23,26,35,7,18,24,14,0,0,24,18,12,11,10,4,-217,10,-124,-76,-74,-28,-214,50,31,34,11,-199,34,-110,-76,-74,-4,-196,62,42,44,0,2,-1,3,1,0,0,3,1,-1,0,1262,1262,1160,1156,1134,1094,1087,1046,854,928,1038,1105,11.538864995,9.4921689606,11.817462411,9.01378579,10.432746048,13.296457824,9.0972333708,10.856712888,9.3821632283,9.5212906638,7.0282177699,7.5937351685,6.7528356634,4.8780487805,6.4938521318,7.3396447186,6.3145502221,8.3843921316,6.6101604563,5.8185665168,4.5106472254,1.8984337921,5.0646267476,4.1357370095,3.938893916,5.956813105,2.7826831487,2.4723207567,2.772002772,3.7027241471,1.8881779083,2.5312450562,1.4771828014,0,0,2.5529199021,1.9264729491,1.2899064818,1.1727704035,1.0579211849,-22.76303367,1.0546854401,-13.0836191,-8.059384942,-7.877787832,-2.978406552,-22.90362284,5.3746103408,3.3050802282,3.5969320286,-20.87485576,3.5859304962,-11.6064363,-8.059384942,-7.877787832,-0.42548665,-20.97714989,6.6645168225,4.4778506317,4.6548532134 +050,2,4,31,181,Nebraska,Webster County,3812,3812,3809,3756,3734,3644,3645,3594,3575,3508,3517,3465,3419,-3,-53,-22,-90,1,-51,-19,-67,9,-52,-46,11,40,41,28,35,35,39,25,39,40,42,18,59,58,64,54,69,56,61,60,46,59,-7,-19,-17,-36,-19,-34,-17,-36,-21,-6,-17,0,0,0,0,0,0,0,0,0,0,0,4,-34,-5,-56,21,-19,0,-31,31,-46,-29,4,-34,-5,-56,21,-19,0,-31,31,-46,-29,0,0,0,2,-1,2,-2,0,-1,0,0,156,156,156,155,155,149,156,156,155,155,156,156,10.575016523,10.947930574,7.5901328273,9.6035121416,9.6698439011,10.880178547,7.059155725,11.103202847,11.458034947,12.202208019,15.598149372,15.487316422,17.348875034,14.816847304,19.063406548,15.622820477,17.224339969,17.081850534,13.176740189,17.141196979,-5.023132849,-4.539385848,-9.758742207,-5.213335163,-9.393562647,-4.742641931,-10.16518424,-5.978647687,-1.718705242,-4.93898896,0,0,0,0,0,0,0,0,0,0,-8.988764045,-1.335113485,-15.18026565,5.7621072849,-5.249343832,0,-8.753353099,8.8256227758,-13.17674019,-8.425334108,-8.988764045,-1.335113485,-15.18026565,5.7621072849,-5.249343832,0,-8.753353099,8.8256227758,-13.17674019,-8.425334108 +050,2,4,31,183,Nebraska,Wheeler County,818,818,825,815,797,779,786,779,803,814,795,780,790,7,-10,-18,-18,7,-7,24,11,-19,-15,10,5,4,9,6,9,7,9,8,8,14,14,1,5,6,6,7,2,3,6,7,5,4,4,-1,3,0,2,5,6,2,1,9,10,0,0,0,0,0,0,0,0,0,0,0,3,-9,-22,-19,6,-13,20,8,-19,-23,-1,3,-9,-22,-19,6,-13,20,8,-19,-23,-1,0,0,1,1,-1,1,-2,1,-1,-1,1,0,0,0,0,0,0,0,0,0,0,0,0,4.8780487805,11.166253102,7.614213198,11.501597444,8.945686901,11.378002528,9.8948670377,9.9440646364,17.777777778,17.834394904,6.0975609756,7.4441687345,7.614213198,8.945686901,2.5559105431,3.7926675095,7.4211502783,8.7010565569,6.3492063492,5.0955414013,-1.219512195,3.7220843672,0,2.5559105431,6.3897763578,7.585335019,2.4737167594,1.2430080796,11.428571429,12.738853503,0,0,0,0,0,0,0,0,0,0,-10.97560976,-27.29528536,-24.11167513,7.6677316294,-16.61341853,25.284450063,9.8948670377,-23.61715351,-29.20634921,-1.27388535,-10.97560976,-27.29528536,-24.11167513,7.6677316294,-16.61341853,25.284450063,9.8948670377,-23.61715351,-29.20634921,-1.27388535 +050,2,4,31,185,Nebraska,York County,13665,13665,13669,13787,13839,13856,13922,13804,13741,13764,13726,13612,13511,4,118,52,17,66,-118,-63,23,-38,-114,-101,49,164,170,161,202,176,161,180,181,154,160,19,148,146,154,160,159,168,176,159,137,136,30,16,24,7,42,17,-7,4,22,17,24,3,1,5,5,4,4,3,4,5,2,3,-30,101,25,4,24,-140,-59,17,-66,-133,-126,-27,102,30,9,28,-136,-56,21,-61,-131,-123,1,0,-2,1,-4,1,0,-2,1,0,-2,737,737,809,797,778,778,766,784,801,788,777,764,11.946386946,12.307246796,11.626647409,14.543883649,12.695664719,11.689961881,13.088529358,13.168424882,11.266369156,11.798104929,10.780885781,10.569753131,11.121141,11.519907841,11.469378922,12.198221093,12.79767315,11.567842852,10.022679055,10.02838919,1.1655011655,1.7374936654,0.5055064091,3.0239758082,1.2262857967,-0.508259212,0.290856208,1.6005820298,1.2436901017,1.7697157394,0.0728438228,0.361977847,0.3610760065,0.287997696,0.2885378345,0.2178253767,0.290856208,0.3637686431,0.1463164826,0.2212144674,7.3572261072,1.8098892348,0.2888608052,1.7279861761,-10.09882421,-4.283899074,1.2361388838,-4.801746089,-9.73004609,-9.291007632,7.4300699301,2.1718670817,0.6499368117,2.0159838721,-9.810286374,-4.066073698,1.5269950918,-4.437977446,-9.583729607,-9.069793164 +040,4,8,32,000,Nevada,Nevada,2700551,2700683,2702483,2713114,2744670,2776956,2818935,2868531,2919555,2972097,3030725,3090771,3138259,1800,10631,31556,32286,41979,49596,51024,52542,58628,60046,47488,8897,35858,34707,35086,35224,36223,36349,36053,35602,35910,35906,4939,20204,20417,21251,21219,22439,23273,24492,24633,25590,28170,3958,15654,14290,13835,14005,13784,13076,11561,10969,10320,7736,989,1101,3660,4534,3893,6468,2866,2951,-697,5814,4562,-3059,-6063,13393,13899,23687,29060,34960,37833,48124,43872,35202,-2070,-4962,17053,18433,27580,35528,37826,40784,47427,49686,39764,-88,-61,213,18,394,284,122,197,232,40,-12,36298,36262,36944,37061,37264,37391,37311,38011,38210,37673,37406,36323,13.24249201,12.718348692,12.708575336,12.589237353,12.737834389,12.559937776,12.238672617,11.861754355,11.732426191,11.528600761,7.4614119182,7.4817911445,7.6973703036,7.5837788835,7.8906845333,8.0416911566,8.3141366802,8.2071399085,8.360701371,9.0447469349,5.7810800914,5.2365575479,5.0112050327,5.0054584694,4.8471498555,4.518246619,3.9245359366,3.6546144463,3.3717248202,2.4838538264,0.4066033717,1.3412036827,1.6422698676,1.3913780665,2.2744751353,0.9903100956,1.0017563834,-0.232224111,1.8995356691,1.4647545444,-2.239088322,4.9078527109,5.03438661,8.465854678,10.218962188,12.079986372,12.842917402,16.033792106,14.333751096,11.302562357,-1.83248495,6.2490563936,6.6766564776,9.8572327445,12.493437323,13.070296468,13.844673786,15.801567996,16.233286765,12.767316902 +050,4,8,32,001,Nevada,Churchill County,24877,24875,24816,24607,24267,23956,23864,24006,23957,24088,24574,25048,25363,-59,-209,-340,-311,-92,142,-49,131,486,474,315,71,310,323,320,338,320,305,320,315,341,348,37,278,265,276,247,265,288,296,287,284,302,34,32,58,44,91,55,17,24,28,57,46,24,17,105,68,47,78,39,20,-16,33,26,-123,-258,-517,-432,-229,11,-103,88,474,384,244,-99,-241,-412,-364,-182,89,-64,108,458,417,270,6,0,14,9,-1,-2,-2,-1,0,0,-1,366,366,367,343,341,347,342,349,302,317,323,327,12.544766607,13.217661742,13.271675342,14.136344626,13.369542511,12.718136897,13.320845041,12.94644692,13.743903914,13.806510484,11.249822957,10.844211646,11.446819982,10.330405688,11.071652392,12.009257136,12.321781663,11.795651638,11.446535811,11.981511972,1.2949436497,2.3734500962,1.8248553595,3.8059389377,2.2978901191,0.7088797615,0.9990633781,1.1507952817,2.2973681029,1.8249985122,0.6879388139,4.2967631051,2.8202310101,1.9657047261,3.258825987,1.6262535705,0.8325528151,-0.657597304,1.3300552174,1.0315208982,-10.44048318,-21.1564431,-17.91676171,-9.577582601,0.4595780238,-4.294977378,3.6632323863,19.481320127,15.477006167,9.680426891,-9.752544362,-16.85967999,-15.0965307,-7.611877875,3.7184040109,-2.668723808,4.4957852014,18.823722823,16.807061384,10.711947789 +050,4,8,32,003,Nevada,Clark County,1951269,1951278,1952640,1962162,1989644,2017798,2053929,2097832,2140240,2183273,2228970,2275884,2315963,1362,9522,27482,28154,36131,43903,42408,43033,45697,46914,40079,6582,26876,26100,26309,26344,27227,27355,27255,26802,26943,26886,3279,13610,13798,14429,14272,15286,15682,16539,16894,17661,19618,3303,13266,12302,11880,12072,11941,11673,10716,9908,9282,7268,862,1231,3456,4319,3706,5905,2906,3034,-182,5543,4322,-2736,-4931,11568,11955,20037,25828,27729,29131,35805,32054,28502,-1874,-3700,15024,16274,23743,31733,30635,32165,35623,37597,32824,-67,-44,156,0,316,229,100,152,166,35,-13,21992,22011,22098,22499,22787,22832,22988,23397,23459,23017,22865,22331,13.730451757,13.209150449,13.130071502,12.939963804,13.115880225,12.909171906,12.60780296,12.148922895,11.961763911,11.710320488,6.9530975002,6.9831363179,7.2011023491,7.0102931754,7.363622328,7.4005349602,7.6507229191,7.6577831275,7.8408756421,8.5447097867,6.777354257,6.2260141313,5.9289691529,5.9296706287,5.7522578973,5.5086369462,4.9570800412,4.4911397672,4.1208882685,3.1656107009,0.6288951523,1.7490737147,2.1554897114,1.820357799,2.8445760727,1.371378306,1.4034883207,-0.082497723,2.4609010636,1.8824669028,-2.51915678,5.854538406,5.9663995137,9.8420154396,12.441949332,13.085667256,13.475615778,16.229840469,14.230871855,12.414176692,-1.890261628,7.6036121206,8.1218892251,11.662373239,15.286525405,14.457045562,14.879104099,16.147342746,16.691772919,14.296643595 +050,4,8,32,005,Nevada,Douglas County,46997,47000,47037,46982,46930,46956,47406,47422,47805,48014,48527,48998,49088,37,-55,-52,26,450,16,383,209,513,471,90,95,393,325,337,375,331,286,318,272,325,329,82,422,419,430,484,510,438,572,544,534,599,13,-29,-94,-93,-109,-179,-152,-254,-272,-209,-270,7,-8,-2,5,23,13,5,-4,-15,3,2,23,-13,53,125,531,187,531,469,799,678,359,30,-21,51,130,554,200,536,465,784,681,361,-6,-5,-9,-11,5,-5,-1,-2,1,-1,-1,230,230,230,230,230,230,230,230,230,230,230,230,8.3600123379,6.9213732004,7.1789191147,7.9481147072,6.9810604463,6.0066997805,6.6375144804,5.634911592,6.6649577032,6.7083987521,8.9769089227,8.9232472953,9.1600451612,10.258366715,10.7563167,9.1990716919,11.93917699,11.269823184,10.951038195,12.213771588,-0.616896585,-2.001874095,-1.981126046,-2.310252008,-3.775256253,-3.192371911,-5.30166251,-5.634911592,-4.286080492,-5.505372836,-0.170178368,-0.042593066,0.106512153,0.4874843687,0.2741806218,0.1050122339,-0.083490748,-0.310748801,0.0615226865,0.0407805395,-0.276539848,1.128716245,2.6628038259,11.254530425,3.9439827899,11.152299243,9.7892902243,16.552552801,13.904127147,7.320106845,-0.446718217,1.0861231791,2.769315979,11.742014794,4.2181634117,11.257311477,9.7057994761,16.241804,13.965649833,7.3608873845 +050,4,8,32,007,Nevada,Elko County,48818,48942,49093,49463,50998,52378,52616,51756,52022,52307,52470,52880,53006,151,370,1535,1380,238,-860,266,285,163,410,126,187,687,622,629,724,690,674,749,778,741,725,37,276,239,243,212,223,309,331,321,274,339,150,411,383,386,512,467,365,418,457,467,386,9,-13,-14,-21,10,18,-17,-16,-36,9,5,-4,-26,1127,984,-286,-1368,-81,-116,-260,-68,-268,5,-39,1113,963,-276,-1350,-98,-132,-296,-59,-263,-4,-2,39,31,2,23,-1,-1,2,2,3,694,701,694,839,816,789,787,847,835,792,794,772,13.941312553,12.382914763,12.169168859,13.791264263,13.221936918,12.989265548,14.358423832,14.850587438,14.0673944,13.693972763,5.600876659,4.7580653189,4.7012846309,4.0383259996,4.2731767141,5.9550193683,6.3453114666,6.1272989301,5.2017085904,6.4031127817,8.3404358943,7.6248494441,7.4678842284,9.7529382631,8.9487602039,7.0342461793,8.0131123657,8.723288508,8.8656858092,7.2908599815,-0.263809408,-0.278715123,-0.406283857,0.1904870755,0.3449200935,-0.327622425,-0.306722004,-0.687173712,0.1708590413,0.0944411915,-0.527618816,22.436567424,19.037300727,-5.447930358,-26.21392711,-1.561024495,-2.223734532,-4.962921252,-1.290934979,-5.062047863,-0.791428224,22.157852301,18.63101687,-5.257443282,-25.86900701,-1.888646919,-2.530456537,-5.650094964,-1.120075937,-4.967606671 +050,4,8,32,009,Nevada,Esmeralda County,783,784,783,770,791,847,834,847,839,858,827,870,886,-1,-13,21,56,-13,13,-8,19,-31,43,16,4,2,2,3,9,9,5,9,3,5,4,1,13,14,16,11,4,8,14,7,6,4,3,-11,-12,-13,-2,5,-3,-5,-4,-1,0,0,2,-1,-1,-1,2,0,2,2,3,3,-4,-3,31,68,-11,5,-4,21,-30,41,14,-4,-1,30,67,-12,7,-4,23,-28,44,17,0,-1,3,2,1,1,-1,1,1,0,-1,1,1,1,1,1,1,1,1,1,1,1,1,2.5756600129,2.5624599616,3.663003663,10.707911957,10.707911957,5.931198102,10.606953447,3.5608308605,5.8927519151,4.555808656,16.741790084,17.937219731,19.536019536,13.087447948,4.759071981,9.4899169632,16.499705362,8.3086053412,7.0713022982,4.555808656,-14.16613007,-15.37475977,-15.87301587,-2.37953599,5.9488399762,-3.558718861,-5.892751915,-4.747774481,-1.178550383,0,2.5756600129,-1.281229981,-1.221001221,-1.189767995,2.3795359905,0,2.3571007661,2.3738872404,3.5356511491,3.416856492,-3.863490019,39.718129404,83.028083028,-13.08744795,5.9488399762,-4.744958482,24.749558044,-35.60830861,48.320565704,15.945330296,-1.287830006,38.436899423,81.807081807,-14.27721594,8.3283759667,-4.744958482,27.10665881,-33.23442136,51.856216853,19.362186788 +050,4,8,32,011,Nevada,Eureka County,1987,1987,1990,1977,1991,2050,1994,2040,1943,1959,2019,2078,2065,3,-13,14,59,-56,46,-97,16,60,59,-13,4,22,14,12,17,29,14,14,14,19,16,12,12,10,16,10,10,18,11,10,13,12,-8,10,4,-4,7,19,-4,3,4,6,4,0,1,0,0,0,0,0,0,0,0,0,10,-24,9,60,-66,27,-93,13,55,53,-15,10,-23,9,60,-66,27,-93,13,55,53,-15,1,0,1,3,3,0,0,0,1,0,-2,1,1,1,1,1,1,1,1,1,1,1,1,11.091504916,7.0564516129,5.9391239792,8.4075173096,14.377788795,7.0298769772,7.1758072783,7.0387129211,9.2750793263,7.7238715906,6.0499117721,5.0403225806,7.9188319723,4.9455984174,4.9578582053,9.0384132563,5.6381342901,5.0276520865,6.3461069075,5.792903693,5.0415931434,2.0161290323,-1.979707993,3.4619188922,9.41993059,-2.008536279,1.5376729882,2.0110608346,2.9289724188,1.9309678977,0.5041593143,0,0,0,0,0,0,0,0,0,-12.09982354,4.5362903226,29.695619896,-32.64094955,13.386217154,-46.69846849,6.6632496156,27.652086476,25.8725897,-7.241129616,-11.59566423,4.5362903226,29.695619896,-32.64094955,13.386217154,-46.69846849,6.6632496156,27.652086476,25.8725897,-7.241129616 +050,4,8,32,013,Nevada,Humboldt County,16528,16519,16580,16640,17078,17365,17230,17033,16814,16734,16778,16884,16962,61,60,438,287,-135,-197,-219,-80,44,106,78,59,267,274,264,258,266,248,237,222,248,251,15,124,138,112,128,146,127,129,129,124,123,44,143,136,152,130,120,121,108,93,124,128,-4,-13,-1,6,5,24,3,7,-5,16,19,19,-69,291,127,-277,-346,-347,-195,-44,-34,-70,15,-82,290,133,-272,-322,-344,-188,-49,-18,-51,2,-1,12,2,7,5,4,0,0,0,1,183,183,183,183,183,183,190,183,183,183,183,154,16.074653823,16.252446764,15.329675115,14.91545021,15.526953273,14.6541791,14.129009181,13.248985438,14.734715703,14.831885599,7.4653822998,8.1855388813,6.5034985338,7.3999132823,8.5223126988,7.5043578456,7.6904733516,7.6987347816,7.3673578516,7.2682148555,8.6092715232,8.066907883,8.8261765816,7.5155369273,7.0046405744,7.1498212545,6.4385358293,5.5502506565,7.3673578516,7.563670744,-0.782661048,-0.059315499,0.3484017072,0.2890591126,1.4009281149,0.1772682956,0.4173125075,-0.298400573,0.9506268196,1.1227323761,-4.154124022,17.26081025,7.3745028017,-16.01387484,-20.19671366,-20.50403285,-11.62513414,-2.625925042,-2.020081992,-4.136382438,-4.936785069,17.201494751,7.7229045089,-15.72481572,-18.79578554,-20.32676456,-11.20782163,-2.924325615,-1.069455172,-3.013650062 +050,4,8,32,015,Nevada,Lander County,5775,5775,5795,5840,5922,6064,5980,5885,5700,5584,5512,5516,5514,20,45,82,142,-84,-95,-185,-116,-72,4,-2,17,85,87,87,99,90,98,88,63,82,71,2,36,34,43,48,44,50,48,43,45,46,15,49,53,44,51,46,48,40,20,37,25,1,0,3,9,15,4,3,-3,-5,0,-2,2,-3,25,88,-156,-147,-237,-153,-89,-34,-26,3,-3,28,97,-141,-143,-234,-156,-94,-34,-28,2,-1,1,1,6,2,1,0,2,1,1,16,16,16,16,16,16,16,16,16,16,16,16,14.611087237,14.793402483,14.516936426,16.439721023,15.170670038,16.918429003,15.59730592,11.355443403,14.871236852,12.873980054,6.1882251826,5.7813297058,7.1750375438,7.9707738293,7.4167720185,8.6318515322,8.5076214108,7.7505407354,8.1610446137,8.3408884859,8.4228620541,9.0120727767,7.341898882,8.4689471936,7.7538980194,8.2865774709,7.089684509,3.6049026676,6.7101922379,4.5330915684,0,0.510117327,1.5017520441,2.4908668217,0.6742520017,0.5179110919,-0.531726338,-0.901225667,0,-0.362647325,-0.515685432,4.2509777249,14.683797764,-25.90501495,-24.77876106,-40.91497626,-27.11804325,-16.04181687,-6.166122597,-4.714415231,-0.515685432,4.7610950519,16.185549808,-23.41414812,-24.10450906,-40.39706517,-27.64976959,-16.94304254,-6.166122597,-5.077062557 +050,4,8,32,017,Nevada,Lincoln County,5345,5339,5351,5269,5369,5268,5201,5135,5143,5179,5225,5179,5159,12,-82,100,-101,-67,-66,8,36,46,-46,-20,10,32,22,20,34,32,35,47,46,57,55,16,38,46,45,45,51,56,56,37,38,61,-6,-6,-24,-25,-11,-19,-21,-9,9,19,-6,0,-2,-1,-1,-2,-1,-1,0,0,0,0,16,-74,121,-76,-55,-47,31,44,37,-64,-14,16,-76,120,-77,-57,-48,30,44,37,-64,-14,2,0,4,1,1,1,-1,1,0,-1,0,239,241,227,242,238,260,248,263,290,291,287,239,6.0263653484,4.1361158112,3.760458776,6.4953672748,6.1919504644,6.8106635532,9.1067622554,8.8427527874,10.957324106,10.640355968,7.1563088512,8.6482421508,8.4610322459,8.5968096284,9.8684210526,10.897061685,10.850610347,7.1126489812,7.3048827374,11.801122074,-1.129943503,-4.51212634,-4.70057347,-2.101442354,-3.676470588,-4.086398132,-1.743848091,1.7301038062,3.6524413687,-1.160766106,-0.376647834,-0.188005264,-0.188022939,-0.382080428,-0.193498452,-0.194590387,0,0,0,0,-13.93596987,22.748636962,-14.28974335,-10.50721177,-9.094427245,6.0323020043,8.5254795582,7.1126489812,-12.3029604,-2.708454246,-14.3126177,22.560631698,-14.47776629,-10.8892922,-9.287925697,5.837711617,8.5254795582,7.1126489812,-12.3029604,-2.708454246 +050,4,8,32,019,Nevada,Lyon County,51980,51985,52049,51393,50981,51114,51359,51999,52770,53945,55800,57499,58319,64,-656,-412,133,245,640,771,1175,1855,1699,820,156,575,534,558,550,589,599,586,568,609,614,149,498,498,507,581,584,623,635,621,654,702,7,77,36,51,-31,5,-24,-49,-53,-45,-88,23,-18,-22,-29,-21,-19,-29,-36,-41,-23,-18,35,-718,-435,121,300,651,823,1254,1939,1771,929,58,-736,-457,92,279,632,794,1218,1898,1748,911,-1,3,9,-10,-3,3,1,6,10,-4,-3,358,358,358,358,360,360,360,360,361,361,361,361,11.117341119,10.432336335,10.930995641,10.734534951,11.397279359,11.434680106,10.982523544,10.351268851,10.750315537,10.602842391,9.6285841341,9.7290327622,9.9319261472,11.339572375,11.300528261,11.892830895,11.900857424,11.317144289,11.544673828,12.12246801,1.4887569846,0.7033035732,0.9990694941,-0.605037424,0.0967510981,-0.458150789,-0.91833388,-0.965875439,-0.794358291,-1.51962562,-0.348021113,-0.429796628,-0.56809834,-0.409864062,-0.367654173,-0.55359887,-0.674694279,-0.74718666,-0.406005349,-0.310832513,-13.88217552,-8.498251509,2.3703413487,5.8552008822,12.596992976,15.710754135,23.501850724,35.336461798,31.262411848,16.04241137,-14.23019663,-8.928048137,1.802243009,5.4453368204,12.229338803,15.157155265,22.827156445,34.589275138,30.8564065,15.731578856 +050,4,8,32,021,Nevada,Mineral County,4772,4770,4791,4634,4663,4561,4473,4423,4382,4458,4560,4516,4518,21,-157,29,-102,-88,-50,-41,76,102,-44,2,15,48,67,48,47,44,47,47,61,36,40,4,74,88,76,65,67,79,75,61,69,96,11,-26,-21,-28,-18,-23,-32,-28,0,-33,-56,2,12,14,10,10,6,3,3,0,4,3,6,-143,36,-86,-83,-33,-13,101,102,-14,56,8,-131,50,-76,-73,-27,-10,104,102,-10,59,2,0,0,2,3,0,1,0,0,-1,-1,52,52,52,52,52,52,52,52,52,52,52,52,10.185676393,14.413251587,10.407632264,10.405136152,9.8920863309,10.675752413,10.633484163,13.528498558,7.9330101366,8.8554350232,15.702917772,18.930837905,16.478751084,14.390081913,15.06294964,17.944349801,16.968325792,13.528498558,15.204936095,21.253044056,-5.517241379,-4.517586318,-6.07111882,-3.98494576,-5.170863309,-7.268597388,-6.334841629,0,-7.271925959,-12.39760903,2.5464190981,3.0117242121,2.1682567216,2.2138587558,1.3489208633,0.6814310051,0.6787330317,0,0.8814455707,0.6641576267,-30.34482759,7.7444336883,-18.64700781,-18.37502767,-7.419064748,-2.952867689,22.850678733,22.621423819,-3.085059498,12.397609033,-27.79840849,10.7561579,-16.47875108,-16.16116892,-6.070143885,-2.271436684,23.529411765,22.621423819,-2.203613927,13.061766659 +050,4,8,32,023,Nevada,Nye County,43946,43944,43848,43981,43604,42905,42877,43008,43295,44046,45328,46845,48054,-96,133,-377,-699,-28,131,287,751,1282,1517,1209,93,417,387,340,359,360,356,386,357,410,417,135,633,675,638,676,683,737,730,783,838,861,-42,-216,-288,-298,-317,-323,-381,-344,-426,-428,-444,4,-12,-4,-14,-14,-11,-31,-30,-43,-24,-11,-52,356,-78,-391,298,463,700,1121,1747,1974,1672,-48,344,-82,-405,284,452,669,1091,1704,1950,1661,-6,5,-7,4,5,2,-1,4,4,-5,-8,334,379,1131,1179,1157,1211,1139,1173,1223,1167,1260,1047,9.4957246468,8.8371296455,7.8604538256,8.3700543238,8.3833032544,8.2500028968,8.8389187209,7.9889005751,8.896314539,8.7882907091,14.414373385,15.413598219,14.749910414,15.760882236,15.90498923,17.07935993,16.716089809,17.521874371,18.183198985,18.145607435,-4.918648738,-6.576468573,-6.889456588,-7.390827913,-7.521685975,-8.829357033,-7.877171088,-9.532973796,-9.286884446,-9.357316726,-0.273258263,-0.091339841,-0.323665746,-0.326408804,-0.256156488,-0.718399129,-0.686962595,-0.962248529,-0.520759875,-0.231825414,8.1066618087,-1.781126905,-9.039521899,6.9478445361,10.781859463,16.221915808,25.669502296,39.094143711,42.832499756,35.237462987,7.8334035455,-1.872466747,-9.363187645,6.6214357324,10.525702975,15.50351668,24.982539701,38.131895182,42.31173988,35.005637573 +050,4,8,32,027,Nevada,Pershing County,6753,6748,6734,6609,6752,6846,6703,6620,6582,6475,6696,6628,6573,-14,-125,143,94,-143,-83,-38,-107,221,-68,-55,13,55,62,61,66,49,56,52,57,44,50,17,55,52,46,45,44,43,52,57,60,58,-4,0,10,15,21,5,13,0,0,-16,-8,0,-3,-2,1,-1,1,-1,0,0,0,1,-11,-123,129,75,-167,-90,-49,-106,220,-53,-47,-11,-126,127,76,-168,-89,-50,-106,220,-53,-46,1,1,6,3,4,1,-1,-1,1,1,-1,1681,1684,1652,1680,1671,1648,1651,1690,1705,1803,1724,1698,8.2440230833,9.2807424594,8.9719076335,9.7424164145,7.355700668,8.4835630965,7.9650762043,8.6553792423,6.6046232363,7.5751836982,8.2440230833,7.7838485143,6.7657008384,6.6425566462,6.6051189672,6.5141645205,7.9650762043,8.6553792423,9.0063044131,8.7872130899,0,1.4968939451,2.2062067951,3.0998597682,0.7505817008,1.969398576,0,0,-2.401681177,-1.212029392,-0.449673986,-0.299378789,0.147080453,-0.14761237,0.1501163402,-0.151492198,0,0,0,0.151503674,-18.43663344,19.309931891,11.031033976,-24.65126578,-13.51047061,-7.423117709,-16.23650149,33.4067269,-7.955568898,-7.120672676,-18.88630743,19.010553102,11.178114429,-24.79887815,-13.36035427,-7.574609908,-16.23650149,33.4067269,-7.955568898,-6.969169002 +050,4,8,32,029,Nevada,Storey County,4010,4013,3997,3905,3838,3795,3801,3881,4004,4001,4027,4193,4207,-16,-92,-67,-43,6,80,123,-3,26,166,14,3,20,22,12,21,14,20,16,12,20,22,4,33,34,35,31,12,15,34,47,35,36,-1,-13,-12,-23,-10,2,5,-18,-35,-15,-14,0,0,0,0,0,-2,-2,-1,-1,-1,-1,-16,-79,-56,-21,17,78,120,16,62,181,30,-16,-79,-56,-21,17,76,118,15,61,180,29,1,0,1,1,-1,2,0,0,0,1,-1,5,5,5,5,5,5,5,5,5,5,5,5,5.0620096178,5.6825519824,3.1442421066,5.5292259084,3.6448841448,5.072923272,3.9975015615,2.9895366218,4.8661800487,5.2380952381,8.3523158694,8.782125791,9.1707061444,8.1621906266,3.1241864098,3.804692454,8.4946908182,11.709018435,8.5158150852,8.5714285714,-3.290306252,-3.099573809,-6.026464038,-2.632964718,0.520697735,1.268230818,-4.497189257,-8.719481814,-3.649635036,-3.333333333,0,0,0,0,-0.520697735,-0.507292327,-0.249843848,-0.249128052,-0.243309002,-0.238095238,-19.99493799,-14.46467777,-5.502423687,4.4760400211,20.307211664,30.437539632,3.9975015615,15.445939213,44.03892944,7.1428571429,-19.99493799,-14.46467777,-5.502423687,4.4760400211,19.786513929,29.930247305,3.7476577139,15.196811161,43.795620438,6.9047619048 +050,4,8,32,031,Nevada,Washoe County,421407,421429,421969,424066,427490,431255,436515,442617,449990,456864,464593,472381,477082,540,2097,3424,3765,5260,6102,7373,6874,7729,7788,4701,1415,5369,5201,5427,5333,5460,5532,5226,5344,5345,5388,916,3380,3367,3557,3650,3769,3890,4168,3931,4103,4440,499,1989,1834,1870,1683,1691,1642,1058,1413,1242,948,64,-51,175,196,110,400,-1,-4,-316,253,209,16,173,1430,1727,3424,3986,5708,5782,6591,6281,3531,80,122,1605,1923,3534,4386,5707,5778,6275,6534,3740,-39,-14,-15,-28,43,25,24,38,41,12,13,5292,5295,5295,5301,5301,5295,5292,5301,5311,5311,5311,5290,12.692146306,12.2152859,12.639374902,12.291275338,12.42134287,12.395152626,11.525559792,11.599021984,11.409067914,11.34957339,7.9902131708,7.9078768748,8.2841821495,8.4123673324,8.5743665343,8.7160418863,9.1922183725,8.5321398611,8.7579804776,9.3526551324,4.7019331352,4.3074090254,4.3551927522,3.8789080056,3.8469763357,3.6791107397,2.3333414199,3.0668821226,2.6510874368,1.996918258,-0.120562388,0.4110123116,0.456480096,0.2535233991,0.9099884886,-0.002240628,-0.008821707,-0.685870312,0.5400363297,0.4402488565,0.4089665321,3.3585577461,4.0221486006,7.8914919852,9.0680352894,12.789503107,12.751777023,14.305605145,13.406988881,7.4378885749,0.288404144,3.7695700576,4.4786286965,8.1450153843,9.978023778,12.787262479,12.742955316,13.619734833,13.947025211,7.8781374314 +050,4,8,32,033,Nevada,White Pine County,10030,10026,10027,10129,10022,10052,10041,9875,9746,9628,9532,9478,9466,1,102,-107,30,-11,-166,-129,-118,-96,-54,-12,30,116,114,87,98,84,107,108,100,89,93,46,89,83,83,84,93,110,74,96,63,87,-16,27,31,4,14,-9,-3,34,4,26,6,1,-2,-3,1,2,13,5,3,2,5,3,16,78,-139,27,-27,-172,-131,-154,-102,-86,-20,17,76,-142,28,-25,-159,-126,-151,-100,-81,-17,0,-1,4,-2,0,2,0,-1,0,1,-1,1229,1226,1285,1236,1259,1307,1269,1329,1376,1302,1179,1110,11.510220282,11.314574959,8.6679286639,9.7546409197,8.435428801,10.906681617,11.148962527,10.438413361,9.3634928985,9.8184121622,8.8311172852,8.2378045755,8.2694032081,8.3611207883,9.3392247439,11.212476428,7.6391039538,10.020876827,6.6280904787,9.1849662162,2.6791029966,3.0767703836,0.3985254558,1.3935201314,-0.903795943,-0.305794812,3.5098585733,0.4175365344,2.7354024198,0.6334459459,-0.198452074,-0.297751973,0.099631364,0.1990743045,1.3054830287,0.5096580195,0.3096934035,0.2087682672,0.5260389269,0.316722973,7.7396308791,-13.7958414,2.6900468267,-2.687503111,-17.27254469,-13.35304011,-15.89759471,-10.64718163,-9.047869542,-2.111486486,7.5411788053,-14.09359337,2.7896781907,-2.488428806,-15.96706166,-12.84338209,-15.58790131,-10.43841336,-8.521830615,-1.794763514 +050,4,8,32,510,Nevada,Carson City,55274,55269,54983,54687,54330,53746,54112,54152,54323,54684,55287,55894,56034,-286,-296,-357,-584,366,40,171,361,603,607,140,143,584,551,572,552,629,612,595,588,596,597,187,633,657,699,630,648,800,728,765,789,786,-44,-49,-106,-127,-78,-19,-188,-133,-177,-193,-189,-4,-40,-43,-15,4,37,-16,-24,-41,-7,1,-256,-206,-202,-452,437,27,376,517,818,808,325,-260,-246,-245,-467,441,64,360,493,777,801,326,18,-1,-6,10,3,-5,-1,1,3,-1,3,3625,3513,3349,2896,2846,2854,2740,2814,2860,2824,2814,2689,10.650132215,10.108515186,10.585143788,10.235680246,11.619744329,11.283705923,10.916730118,10.693728347,10.72125633,10.667572011,11.543722075,12.05316602,12.935341797,11.682026368,11.970738196,14.749942383,13.35694038,13.912758818,14.193072557,14.044743049,-0.89358986,-1.944650834,-2.350198009,-1.446346122,-0.350993867,-3.46623646,-2.440210262,-3.219030472,-3.471816228,-3.377171039,-0.729461111,-0.788867791,-0.277582442,0.074171596,0.6835143723,-0.294998848,-0.440338694,-0.745651126,-0.125920796,0.0178686298,-3.75672472,-3.705844043,-8.364484252,8.1032468616,0.4987807581,6.93247292,9.4856293633,14.876649298,14.534857575,5.8073046959,-4.48618583,-4.494711834,-8.642066694,8.1774184576,1.1822951304,6.6374740724,9.0452906694,14.130998172,14.408936779,5.8251733257 +040,1,1,33,000,New Hampshire,New Hampshire,1316470,1316457,1316807,1320444,1324677,1327272,1334257,1337480,1343694,1350395,1355064,1360783,1366275,350,3637,4233,2595,6985,3223,6214,6701,4669,5719,5492,3269,12990,12374,12598,12214,12375,12381,12204,12002,12037,12016,2538,10742,10514,10885,11154,11990,11836,12348,12654,12576,13114,731,2248,1860,1713,1060,385,545,-144,-652,-539,-1098,501,3078,3442,2734,3034,4102,3995,2763,2570,2842,2313,-805,-1671,-901,-1721,3011,-1136,1727,4124,2782,3398,4244,-304,1407,2541,1013,6045,2966,5722,6887,5352,6240,6557,-77,-18,-168,-131,-120,-128,-53,-42,-31,18,33,40104,40105,40828,41114,40954,43393,42736,42800,42230,41156,40464,40463,9.8511669917,9.3560937288,9.5009368581,9.1781829167,9.2636363534,9.2355065356,9.0598343262,8.8724316281,8.8642695999,8.8124271651,8.1463614954,7.9497308441,8.2090568107,8.3816482931,8.9754343335,8.8289682057,9.1667350262,9.3544200818,9.2611991765,9.6176905662,1.7048054963,1.4063628847,1.2918800475,0.7965346235,0.2882020199,0.4065383299,-0.1069007,-0.481988454,-0.396929577,-0.805263401,2.3342488068,2.6025274458,2.0618797722,2.2798924979,3.070661521,2.9800378491,2.0511571815,1.8998624633,2.0929014042,1.696333558,-1.267228641,-0.681254279,-1.297913346,2.2626091994,-0.850383103,1.2882416434,3.0615172698,2.0565826353,2.5023500956,3.1125117251,1.0670201661,1.9212731667,0.7639664262,4.5425016973,2.2202784181,4.2682794925,5.1126744514,3.9564450986,4.5952514998,4.8088452831 +050,1,1,33,001,New Hampshire,Belknap County,60088,60075,60101,60339,60450,60257,60313,60408,60774,60907,61242,61398,61551,26,238,111,-193,56,95,366,133,335,156,153,152,586,525,531,528,530,509,497,490,477,466,128,603,620,651,640,688,683,741,758,779,841,24,-17,-95,-120,-112,-158,-174,-244,-268,-302,-375,16,123,82,78,36,59,49,32,31,44,30,-7,135,137,-147,143,198,492,348,574,416,501,9,258,219,-69,179,257,541,380,605,460,531,-7,-3,-13,-4,-11,-4,-1,-3,-2,-2,-3,858,858,873,895,906,973,928,1007,988,1058,1033,1032,9.7309863833,8.6928445471,8.7981641496,8.7583976113,8.7805767017,8.400587546,8.1689006501,8.0229883175,7.7788649706,7.5803788563,10.013284623,10.265835465,10.786449833,10.616239529,11.398182586,11.272301167,12.179387086,12.411071724,12.703848663,13.680469138,-0.28229824,-1.572990918,-1.988285684,-1.857841918,-2.617605885,-2.871713621,-4.010486436,-4.388083406,-4.924983692,-6.100090281,2.0425107938,1.3577395293,1.2923856943,0.5971634735,0.9774604253,0.8087009622,0.5259654342,0.5075768119,0.7175472929,0.4880072225,2.2417801395,2.2684184818,-2.435649962,2.3720660197,3.2802909187,8.1200178244,5.719874097,9.3983577434,6.7840834964,8.1497206159,4.2842909332,3.6261580111,-1.143264268,2.9692294932,4.257751344,8.9287187866,6.2458395312,9.9059345553,7.5016307893,8.6377278384 +050,1,1,33,003,New Hampshire,Carroll County,47818,47823,47834,47691,47716,47548,47470,47442,47527,48176,48690,48745,49167,11,-143,25,-168,-78,-28,85,649,514,55,422,95,380,369,357,344,376,330,330,302,337,323,122,514,451,499,522,541,524,543,596,578,624,-27,-134,-82,-142,-178,-165,-194,-213,-294,-241,-301,5,29,47,35,31,28,19,15,13,17,18,37,-36,69,-51,81,116,265,842,792,279,711,42,-7,116,-16,112,144,284,857,805,296,729,-4,-2,-9,-10,-12,-7,-5,5,3,0,-6,437,437,453,440,441,433,435,439,436,426,400,399,7.9560324522,7.7352814783,7.4949613705,7.2407333347,7.923128793,6.9496361971,6.8963355381,6.2354180001,6.9174321342,6.597761255,10.761580738,9.4542329179,10.476150487,10.987391863,11.400033715,11.035179901,11.347606658,12.305659364,11.864319803,12.74613939,-2.805548286,-1.71895144,-2.981189117,-3.746658528,-3.476904922,-4.085543704,-4.45127112,-6.070241364,-4.946887669,-6.148378135,0.6071708977,0.9852526544,0.7348001344,0.6525079459,0.5900202293,0.4001305689,0.3134697972,0.2684120331,0.3489505824,0.3676770978,-0.75372939,1.446434748,-1.070708767,1.7049401166,2.4443695212,5.5807684613,17.596104615,16.352486941,5.726894853,14.523245363,-0.146558493,2.4316874024,-0.335908633,2.3574480625,3.0343897505,5.9808990302,17.909574413,16.620898974,6.0758454354,14.890922461 +050,1,1,33,005,New Hampshire,Cheshire County,77117,77123,77063,76965,76957,76787,76514,76390,76104,76062,75925,75880,76228,-60,-98,-8,-170,-273,-124,-286,-42,-137,-45,348,186,742,714,701,625,643,691,645,652,636,643,149,698,719,700,663,679,738,743,803,751,755,37,44,-5,1,-38,-36,-47,-98,-151,-115,-112,2,55,72,62,81,126,108,51,47,66,56,-98,-197,-67,-231,-310,-207,-346,12,-29,3,403,-96,-142,5,-169,-229,-81,-238,63,18,69,459,-1,0,-8,-2,-6,-7,-1,-7,-4,1,1,4627,4627,4700,4637,4554,4610,4714,4612,4376,4079,3922,3924,9.6346118887,9.2774262289,9.1190550526,8.153893321,8.4105059384,9.0626516453,8.4775836915,8.5796811569,8.3791706466,8.4545191574,9.0632871945,9.3423941997,9.1060464148,8.6496500349,8.8813896301,9.6790693404,9.765650671,10.566693204,9.8942722572,9.92715702,0.5713246942,-0.064967971,0.0130086377,-0.495756714,-0.470883692,-0.616417695,-1.288066979,-1.987012047,-1.515101611,-1.472637863,0.7141558678,0.9355387794,0.8065355396,1.0567445744,1.648092921,1.4164491718,0.670320571,0.6184739484,0.8695365765,0.7363189313,-2.557976472,-0.870570809,-3.004995317,-4.044331087,-2.707581227,-4.537883458,0.1577224873,-0.381611585,0.0395243898,5.2988665948,-1.843820604,0.0649679708,-2.198459777,-2.987586513,-1.059488306,-3.121434286,0.8280430582,0.2368623632,0.9090609664,6.0351855261 +050,1,1,33,007,New Hampshire,Coos County,33055,33052,32970,32512,31980,31952,32787,32351,31923,31418,31490,31421,31174,-82,-458,-532,-28,835,-436,-428,-505,72,-69,-247,82,255,223,262,261,257,242,236,221,245,240,98,434,391,405,453,436,476,435,479,434,450,-16,-179,-168,-143,-192,-179,-234,-199,-258,-189,-210,4,15,13,4,3,9,13,6,6,9,9,-71,-295,-386,113,980,-266,-207,-313,323,111,-45,-67,-280,-373,117,983,-257,-194,-307,329,120,-36,1,1,9,-2,44,0,0,1,1,0,-1,1467,1467,1354,1394,1384,2537,2573,2436,2246,2371,2133,2134,7.7883998656,6.9155864293,8.1962084715,8.0631458626,7.8909392367,7.5302610698,7.4517295275,7.0261334012,7.7887809763,7.6683441169,13.255551144,12.12553495,12.669711569,13.994655463,13.386963063,14.811587889,13.735179426,15.228587779,13.797269158,14.378145219,-5.467151278,-5.209948521,-4.473503097,-5.9315096,-5.496023826,-7.28132682,-6.283449898,-8.202454378,-6.008488182,-6.709801102,0.4581411686,0.4031507784,0.1251329538,0.0926798375,0.2763363935,0.4045181566,0.1894507507,0.190754753,0.2861184848,0.2875629044,-9.010109648,-11.97047696,3.5350059438,30.275413584,-8.16727563,-6.441173725,-9.883014161,10.268964202,3.5287946464,-1.437814522,-8.55196848,-11.56732618,3.6601388976,30.368093421,-7.890939237,-6.036655568,-9.693563411,10.459718955,3.8149131312,-1.150251618 +050,1,1,33,009,New Hampshire,Grafton County,89118,89135,89133,89304,89673,89975,90041,89566,90212,90176,90206,90369,90691,-2,171,369,302,66,-475,646,-36,30,163,322,181,759,796,726,769,794,707,718,685,680,675,189,755,770,800,827,803,808,844,879,882,909,-8,4,26,-74,-58,-9,-101,-126,-194,-202,-234,45,405,385,271,260,308,378,258,240,267,218,-29,-238,-23,120,-126,-778,371,-164,-12,98,335,16,167,362,391,134,-470,749,94,228,365,553,-10,0,-19,-15,-10,4,-2,-4,-4,0,3,7001,7002,7062,7029,6889,6979,6618,7090,7001,7110,7055,7056,8.5072042233,8.8949976813,8.0824723905,8.5436850058,8.8415262211,7.865256038,7.9606182229,7.5949928485,7.5314966081,7.4560919032,8.4623704725,8.604457556,8.9063056644,9.1880721714,8.9417450322,8.9888640434,9.3576069362,9.7459835239,9.7687941299,10.04087043,0.0448337508,0.2905401253,-0.823833274,-0.644387166,-0.100218811,-1.123608005,-1.396988713,-2.150990675,-2.237297522,-2.584778526,4.5394172733,4.302228778,3.0170110438,2.8886321216,3.4297104233,4.2051863966,2.8605006985,2.6610193922,2.9572199917,2.4080415332,-2.667608175,-0.257016265,1.3359458497,-1.399875567,-8.663359446,4.1273125744,-1.81830277,-0.13305097,1.08542157,3.7004307964,1.8718090979,4.0452125133,4.3529568935,1.488756555,-5.233649023,8.332498971,1.0421979289,2.5279684226,4.0426415617,6.1084723296 +050,1,1,33,011,New Hampshire,Hillsborough County,400721,400706,401064,402832,404439,405417,407455,409229,411591,413545,414917,417738,418735,358,1768,1607,978,2038,1774,2362,1954,1372,2821,997,1131,4547,4309,4367,4122,4231,4208,4255,4086,4218,4196,635,2944,2973,3026,3034,3407,3269,3483,3517,3436,3708,496,1603,1336,1341,1088,824,939,772,569,782,488,280,1534,1718,1281,1434,1979,1969,1470,1396,1403,1162,-404,-1365,-1411,-1622,-420,-993,-528,-271,-589,624,-677,-124,169,307,-341,1014,986,1441,1199,807,2027,485,-14,-4,-36,-22,-64,-36,-18,-17,-4,12,24,7759,7759,7970,8036,8107,8167,8160,8029,7940,7550,7687,7678,11.31240857,10.675473292,10.784633318,10.141818146,10.361412737,10.253161473,10.313451358,9.8640613571,10.131446998,10.032601172,7.3243305104,7.3655563002,7.4729334598,7.4648899212,8.3434963829,7.9652055262,8.4422446724,8.4904316674,8.2531180381,8.8657972224,3.9880780598,3.3099169919,3.3116998578,2.6769282249,2.0179163544,2.2879559465,1.8712066859,1.3736296897,1.8783289598,1.1668039494,3.8164140635,4.2563154133,3.1635253675,3.528230767,4.8464277493,4.797641383,3.5630490004,3.3701002581,3.3699431337,2.778332355,-3.395961667,-3.4957282,-4.005650387,-1.033373028,-2.431785121,-1.28651836,-0.656861414,-1.421911928,1.4988200395,-1.618701381,0.4204523968,0.760587213,-0.84212502,2.494857739,2.414642628,3.5111230233,2.906187586,1.9481883297,4.8687631732,1.1596309743 +050,1,1,33,013,New Hampshire,Merrimack County,146445,146452,146395,146894,147149,147555,148252,148770,149246,150054,150981,151606,152622,-57,499,255,406,697,518,476,808,927,625,1016,355,1424,1298,1391,1331,1320,1360,1297,1309,1283,1273,340,1243,1267,1243,1333,1418,1363,1409,1432,1474,1437,15,181,31,148,-2,-98,-3,-112,-123,-191,-164,55,317,400,380,488,540,543,363,336,412,317,-119,4,-144,-112,241,94,-59,564,719,402,860,-64,321,256,268,729,634,484,927,1055,814,1177,-8,-3,-32,-10,-30,-18,-5,-7,-5,2,3,6335,6335,6470,6560,6735,7168,7000,6798,6646,6672,6500,6505,9.7105585276,8.828640709,9.439980455,8.9991109068,8.8882305014,9.1270267368,8.6668894086,8.6966631787,8.4802056929,8.3687234574,8.4762810743,8.6177871944,8.4355828221,9.0126332372,9.5481142811,9.147159884,9.4153023722,9.5138439052,9.7426525264,9.4468622218,1.2342774533,0.2108535146,1.0043976329,-0.01352233,-0.65988378,-0.020133147,-0.748412964,-0.817180726,-1.262446833,-1.078138764,2.1616903464,2.7206905113,2.5788587871,3.299448627,3.636094296,3.6440996457,2.425659873,2.2322985699,2.7231837455,2.0839633433,0.0272768498,-0.979448584,-0.760084695,1.6294408178,0.6329497478,-0.395951895,3.7687938523,4.7768531898,2.6570870526,5.653654496,2.1889671962,1.7412419272,1.818774092,4.9288894448,4.2690440439,3.2481477505,6.1944537254,7.0091517598,5.3802707982,7.7376178393 +050,1,1,33,015,New Hampshire,Rockingham County,295223,295207,295300,296241,298250,299603,301596,302975,304748,306970,308377,309647,311307,93,941,2009,1353,1993,1379,1773,2222,1407,1270,1660,638,2587,2512,2609,2598,2607,2745,2642,2709,2631,2674,557,2209,2041,2142,2245,2529,2420,2502,2574,2570,2754,81,378,471,467,353,78,325,140,135,61,-80,59,296,347,310,350,593,403,233,179,229,197,-23,273,1231,628,1334,747,1066,1865,1107,980,1540,36,569,1578,938,1684,1340,1469,2098,1286,1209,1737,-24,-6,-40,-52,-44,-39,-21,-16,-14,0,3,2498,2497,2574,2646,2509,2591,2602,2549,2492,2365,2417,2412,8.7466464708,8.4509269274,8.727897995,8.6427289467,8.6242972289,9.0337209551,8.6379671679,8.8047881927,8.514232457,8.6125542311,7.4686285481,6.8663781285,7.1656410522,7.4684089628,8.3662630196,7.9641547218,8.1802399145,8.3660113724,8.3168291199,8.8702222709,1.2780179227,1.5845487989,1.5622569428,1.1743199839,0.2580342094,1.0695662333,0.4577272534,0.4387768202,0.1974033371,-0.25766804,1.0007759395,1.1673852085,1.0370442232,1.1643399274,1.9617216175,1.3262621293,0.7617889289,0.5817855616,0.7410715441,0.6345075481,0.9230129442,4.1413579011,2.1008508781,4.4377984661,2.4711737745,3.5081772452,6.0975809115,3.5979699259,3.1713978745,4.9601097666,1.9237888836,5.3087431097,3.1378951013,5.6021383934,4.4328953919,4.8344393745,6.8593698404,4.1797554876,3.9124694187,5.5946173146 +050,1,1,33,017,New Hampshire,Strafford County,123143,123146,123203,124157,124823,125109,126652,127174,128481,130034,130042,130716,131533,57,954,666,286,1543,522,1307,1553,8,674,817,319,1296,1219,1269,1253,1199,1219,1187,1174,1139,1156,204,924,891,946,1037,1062,1097,1170,1168,1208,1155,115,372,328,323,216,137,122,17,6,-69,1,30,267,332,281,332,456,497,328,316,382,299,-83,317,27,-310,974,-56,685,1200,-313,356,508,-53,584,359,-29,1306,400,1182,1528,3,738,807,-5,-2,-21,-8,21,-15,3,8,-1,5,9,8421,8422,8656,8764,8744,9219,8943,9110,9384,8798,8598,8602,10.478654592,9.7919511607,10.154762095,9.9538848352,9.4474167343,9.5362891397,9.1832195424,9.0281302389,8.736069459,8.8160488696,7.4708926261,7.1572013816,7.5700590561,8.2379717272,8.3679370908,8.5818779214,9.0516991277,8.9819898799,9.2652957915,8.8084225297,3.0077619664,2.6347497791,2.5847030392,1.7159131081,1.0794796435,0.9544112182,0.1315204147,0.046140359,-0.529226332,0.0076263399,2.1587968952,2.666880874,2.2486116224,2.6374219994,3.5930125361,3.8880522579,2.5375703538,2.4300589059,2.9299196957,2.2802756159,2.5630659767,0.2168848904,-2.480674744,7.7374970706,-0.441247154,5.3587842992,9.2837939771,-2.406988726,2.7305010776,3.8741806451,4.7218628719,2.8837657643,-0.232063121,10.37491907,3.1517653826,9.2468365571,11.821364331,0.0230701795,5.6604207733,6.154456261 +050,1,1,33,019,New Hampshire,Sullivan County,43742,43738,43744,43509,43240,43069,43177,43175,43088,43053,43194,43263,43267,6,-235,-269,-171,108,-2,-87,-35,141,69,4,130,414,409,385,383,418,370,397,374,391,370,116,418,391,473,400,427,458,478,448,464,481,14,-4,18,-88,-17,-9,-88,-81,-74,-73,-111,5,37,46,32,19,4,16,7,6,13,7,-8,-269,-334,-109,114,9,-12,41,210,129,108,-3,-232,-288,-77,133,13,4,48,216,142,115,-5,1,1,-6,-8,-6,-3,-2,-1,0,0,701,701,716,713,685,716,763,730,721,727,719,721,9.4896450552,9.4295035101,8.9214334542,8.8815713192,9.6813044284,8.5784171661,9.2174458156,8.6727654295,9.0449587656,8.5519473015,9.581332447,9.0145131356,10.960618244,9.2757925005,9.8897535668,10.618689357,11.098083375,10.388767146,10.733659507,11.117531492,-0.091687392,0.4149903745,-2.03918479,-0.394221181,-0.208449138,-2.040272191,-1.880637559,-1.716001716,-1.688700741,-2.56558419,0.8481083745,1.0605309571,0.7415217416,0.4406001438,0.0926440615,0.3709585802,0.1625242335,0.1391352743,0.3007275293,0.1617935976,-6.165977101,-7.70037695,-2.525808432,2.6436008626,0.2084491384,-0.278218935,0.9519276535,4.8697345995,2.9841424061,2.4962440772,-5.317868727,-6.639845992,-1.784286691,3.0842010064,0.3010931999,0.092739645,1.114451887,5.0088698737,3.2848699353,2.6580376748 +040,1,2,34,000,New Jersey,New Jersey,8791894,8791959,8799451,8828552,8845671,8857821,8867277,8870312,8873584,8888147,8891730,8891258,8882371,7492,29101,17119,12150,9456,3035,3272,14563,3583,-472,-8887,26548,106695,104516,103463,103333,103111,103023,101476,101901,100471,99603,17107,71059,69003,72450,70503,72550,71179,74763,74807,76740,81630,9441,35636,35513,31013,32830,30561,31844,26713,27094,23731,17973,7070,34483,27902,28778,30103,41337,38908,45043,27118,23880,19674,-8801,-41037,-46113,-47617,-53549,-69052,-67560,-57192,-50643,-48119,-46623,-1731,-6554,-18211,-18839,-23446,-27715,-28652,-12149,-23525,-24239,-26949,-218,19,-183,-24,72,189,80,-1,14,36,89,186903,186676,187300,188546,188260,189068,187466,186287,183766,182140,180692,180001,12.105171527,11.826941416,11.688428475,11.659512404,11.626270064,11.612218647,11.426363793,11.462508993,11.299675848,11.207953086,8.0620589865,7.808320626,8.1848259089,7.95516053,8.1803676926,8.0229279973,8.4184362436,8.4147938706,8.6307205516,9.185518613,4.0431125409,4.0186207903,3.5036025661,3.7043518744,3.4459023715,3.5892906496,3.0079275494,3.047715122,2.6689552959,2.022434473,3.91229795,3.1573665219,3.251110007,3.3966525883,4.660949129,4.3855081207,5.0719155695,3.0504148032,2.6857128847,2.2138416415,-4.655887567,-5.218107749,-5.379390687,-6.042166875,-7.785951067,-7.615013073,-6.439912867,-5.696664831,-5.411801436,-5.246311825,-0.743589617,-2.060741227,-2.12828068,-2.645514287,-3.125001938,-3.229504952,-1.367997297,-2.646250027,-2.726088552,-3.032470184 +050,1,2,34,001,New Jersey,Atlantic County,274549,274532,274654,274635,274657,274360,272634,270206,267212,265446,263994,263653,262945,122,-19,22,-297,-1726,-2428,-2994,-1766,-1452,-341,-708,801,3409,3377,3238,3179,3010,2885,2813,2842,2747,2761,550,2569,2465,2651,2533,2633,2682,2809,2736,2895,3055,251,840,912,587,646,377,203,4,106,-148,-294,232,1137,910,834,827,878,733,818,519,310,295,-351,-2001,-1809,-1711,-3256,-3718,-3943,-2594,-2081,-508,-719,-119,-864,-899,-877,-2429,-2840,-3210,-1776,-1562,-198,-424,-10,5,9,-7,57,35,13,6,4,5,10,6046,6046,6035,6019,6213,6218,6221,6218,6219,6037,5990,5995,12.412409497,12.295828084,11.795627458,11.623527863,11.089823889,10.736521665,10.56212429,10.735871865,10.41226426,10.486177312,9.3539102367,8.9751898808,9.6572601577,9.2615275487,9.7008326579,9.9810575753,10.547105272,10.335448776,10.97324537,11.60277859,3.05849926,3.3206382034,2.1383673001,2.3620003144,1.3889912313,0.7554640894,0.0150190178,0.4004230885,-0.56098111,-1.116601278,4.1398972126,3.313356102,3.0381572884,3.0237991642,3.2348389949,2.7278580174,3.0713891465,1.9605621034,1.1750280017,1.1203992419,-7.285782166,-6.586660647,-6.232958178,-11.9050666,-13.69832732,-14.67386652,-9.739833064,-7.861136295,-1.925529758,-2.730735779,-3.145884953,-3.273304545,-3.19480089,-8.881267436,-10.46348832,-11.94600851,-6.668443917,-5.900574192,-0.750501756,-1.610336538 +050,1,2,34,003,New Jersey,Bergen County,905116,905107,906293,912024,916299,920021,923475,926481,928381,932449,932897,932256,930394,1186,5731,4275,3722,3454,3006,1900,4068,448,-641,-1862,2374,9350,8980,9232,9271,9432,9659,9276,9303,9031,8901,1680,6980,6865,7329,6936,7117,6976,7289,7267,7490,7939,694,2370,2115,1903,2335,2315,2683,1987,2036,1541,962,670,3794,3001,2830,3029,4141,3793,4503,2092,2264,1783,-79,-407,-698,-862,-1804,-3407,-4569,-2389,-3666,-4450,-4632,591,3387,2303,1968,1225,734,-776,2114,-1574,-2186,-2849,-99,-26,-143,-149,-106,-43,-7,-33,-14,4,25,10422,10421,10421,10427,10429,10416,10426,10428,10433,10433,10431,10435,10.284235367,9.8232095751,10.054892393,10.058063592,10.19699928,10.414790966,9.9697446838,9.9745569991,9.6839240534,9.5573510858,7.6774291831,7.5096140015,7.9822688856,7.5248332516,7.6942370521,7.5218533778,7.8341385296,7.7915839742,8.0315126963,8.5244141411,2.606806184,2.3135955736,2.0726235079,2.5332303406,2.5027622279,2.8929375878,2.1356061542,2.1829730248,1.6524113571,1.0329369447,4.1730897308,3.2827897478,3.0822514594,3.2861476239,4.4768632335,4.0897921247,4.839775799,2.2430155049,2.4276828764,1.9144766864,-0.447666716,-0.763541234,-0.93883419,-1.957150978,-3.683330847,-4.926512053,-2.567671415,-3.930638069,-4.771726502,-4.973559176,3.7254230148,2.5192485135,2.1434172693,1.3289966455,0.7935323867,-0.836719928,2.2721043835,-1.687622564,-2.344043625,-3.05908249 +050,1,2,34,005,New Jersey,Burlington County,448734,448730,449125,450250,450667,448992,449806,447906,447092,446229,445429,446160,446596,395,1125,417,-1675,814,-1900,-814,-863,-800,731,436,1213,4758,4663,4477,4605,4534,4433,4396,4382,4390,4331,932,3701,3693,3931,3821,4101,3984,4293,4194,4220,4404,281,1057,970,546,784,433,449,103,188,170,-73,193,537,745,547,534,743,551,594,244,222,214,-31,-457,-1258,-2791,-414,-3083,-1808,-1549,-1226,339,280,162,80,-513,-2244,120,-2340,-1257,-955,-982,561,494,-48,-12,-40,23,-90,7,-6,-11,-6,0,15,13214,13231,13525,13494,13534,14302,13365,13121,12478,11938,11756,11774,10.580681028,10.351675016,9.9526598411,10.247018796,10.10123514,9.9061673881,9.8419269221,9.8288805798,9.8475867244,9.7025391036,8.2301598332,8.1983134961,8.738866615,8.5024666277,9.1365605005,8.9028131906,9.6113267235,9.4071942381,9.4662450972,9.8660776293,2.3505211953,2.1533615194,1.2137932261,1.7445521686,0.9646746395,1.0033541974,0.2306001986,0.4216863416,0.3813416271,-0.163538526,1.1941626129,1.6538704453,1.2160162906,1.1882536454,1.6553193006,1.2312876677,1.3298691064,0.5472950391,0.4979873013,0.4794143081,-1.016261293,-2.792710094,-6.204573066,-0.921230354,-6.868572549,-4.040232492,-3.467958326,-2.74993327,0.7604400682,0.6272710573,0.1779013204,-1.138839649,-4.988556775,0.2670232911,-5.213253248,-2.808944824,-2.13808922,-2.202638231,1.2584273696,1.1066853653 +050,1,2,34,007,New Jersey,Camden County,513657,513541,513283,512610,511636,509983,508409,507760,507119,506488,506685,506503,506809,-258,-673,-974,-1653,-1574,-649,-641,-631,197,-182,306,1643,6568,6459,6315,6315,6231,6082,6078,6110,6073,6100,1124,4500,4377,4684,4566,4691,4581,4869,5014,5125,5251,519,2068,2082,1631,1749,1540,1501,1209,1096,948,849,227,996,911,992,1048,1392,1341,1564,1268,617,646,-1020,-3748,-3995,-4324,-4413,-3581,-3485,-3411,-2163,-1756,-1222,-793,-2752,-3084,-3332,-3365,-2189,-2144,-1847,-895,-1139,-576,16,11,28,48,42,0,2,7,-4,9,33,7728,7728,7743,7779,7781,7780,7781,7779,7493,7492,7508,7501,12.804454266,12.61220449,12.362730137,12.401904178,12.263708104,11.985665286,11.992813783,12.061118881,11.987903528,12.039727152,8.7728447314,8.5467748959,9.1697589806,8.9670775104,9.2327162116,9.0276771911,9.6072738251,9.8976186693,10.11658251,10.36403398,4.0316095343,4.0654295941,3.1929711566,3.4348266679,3.0309918921,2.9579880951,2.3855399578,2.1635002117,1.8713210184,1.6756931725,1.9417229672,1.7788695294,1.9420155655,2.0581465683,2.7397017622,2.6426795707,3.0860086799,2.5030276172,1.2179378358,1.2750268427,-7.306804901,-7.80086034,-8.464995267,-8.666603822,-7.048040237,-6.867813798,-6.730419186,-4.269754524,-3.466286612,-2.411892882,-5.365081933,-6.021990811,-6.522979702,-6.608457254,-4.308338475,-4.225134228,-3.644410506,-1.766726906,-2.248348776,-1.136866039 +050,1,2,34,009,New Jersey,Cape May County,97265,97261,97222,96522,96267,95540,94961,94330,93825,93283,92604,92247,91546,-39,-700,-255,-727,-579,-631,-505,-542,-679,-357,-701,236,893,960,889,927,922,877,776,792,816,813,351,1277,1246,1384,1288,1302,1264,1319,1349,1329,1393,-115,-384,-286,-495,-361,-380,-387,-543,-557,-513,-580,39,159,174,113,119,153,105,108,125,-13,32,52,-473,-122,-334,-323,-395,-216,-100,-240,171,-151,91,-314,52,-221,-204,-242,-111,8,-115,158,-119,-15,-2,-21,-11,-14,-9,-7,-7,-7,-2,-2,2628,2628,2630,2629,2637,2640,2710,2712,2711,2715,2712,2711,9.2183499876,9.9590744285,9.2697346812,9.7322323767,9.7416147625,9.3221014589,8.2946747333,8.5213059547,8.8287323304,8.8469092947,13.182343711,12.926048685,14.431173002,13.522238728,13.756596986,13.435731179,14.098809244,14.514194107,14.379148612,15.1583575,-3.963993724,-2.966974257,-5.161438321,-3.790006352,-4.014982223,-4.11362972,-5.804134511,-5.992888152,-5.550416281,-6.311448205,1.6413411512,1.8050822402,1.1782677379,1.2493372738,1.6165586319,1.1161010869,1.1544134938,1.3449030863,-0.140653824,0.348217832,-4.882731852,-1.265632375,-3.482667473,-3.391058315,-4.173468364,-2.295979379,-1.068901383,-2.582213926,1.8501387604,-1.643152895,-3.241390701,0.5394498649,-2.304399735,-2.141721041,-2.556909732,-1.179878292,0.0855121107,-1.237310839,1.7094849365,-1.294935063 +050,1,2,34,011,New Jersey,Cumberland County,156898,156610,156667,157028,156862,155912,155887,154580,153003,151147,150274,148995,147008,57,361,-166,-950,-25,-1307,-1577,-1856,-873,-1279,-1987,565,2244,2150,2027,2011,2020,1896,1841,1919,1851,1850,374,1435,1407,1461,1534,1559,1462,1659,1598,1599,1630,191,809,743,566,477,461,434,182,321,252,220,62,329,210,283,337,438,455,362,530,-53,87,-193,-777,-1122,-1835,-830,-2228,-2479,-2412,-1736,-1480,-2290,-131,-448,-912,-1552,-493,-1790,-2024,-2050,-1206,-1533,-2203,-3,0,3,36,-9,22,13,12,12,2,-4,11806,11762,11867,11973,11334,11816,11380,10769,10164,9708,9693,8760,14.306890451,13.699066552,12.961435413,12.89933579,13.012655129,12.328379657,12.105868815,12.733021256,12.370141912,12.499873312,9.1490141698,8.964924018,9.3422087514,9.839672353,10.04293532,9.5063771405,10.909090909,10.603109936,10.686038313,11.013401891,5.1578762811,4.734142534,3.6192266621,3.059663437,2.9697198092,2.8220025164,1.1967779056,2.12991132,1.6841035991,1.4864714209,2.0975788584,1.3380483609,1.809613331,2.1616490111,2.8215559142,2.9585510253,2.3804044057,3.5166760113,-0.354196392,0.5878318801,-4.953856453,-7.149001242,-11.73371188,-5.323942668,-14.35257209,-16.11922636,-15.8605951,-11.51877275,-9.890767169,-15.47281615,-2.856277594,-5.810952882,-9.92409855,-3.162293657,-11.53101618,-13.16067533,-13.4801907,-8.002096735,-10.24496356,-14.88498427 +050,1,2,34,013,New Jersey,Essex County,783969,783855,784017,785576,785092,786685,788796,790546,793073,797222,800530,802162,800501,162,1559,-484,1593,2111,1750,2527,4149,3308,1632,-1661,2579,10509,10382,10420,10352,10189,10462,10382,10483,10230,10253,1432,5982,5711,5737,5733,5737,5760,6176,5969,6277,6750,1147,4527,4671,4683,4619,4452,4702,4206,4514,3953,3503,869,4041,3382,3596,3454,4894,4980,6133,4156,3781,3010,-1913,-7039,-8690,-6737,-5971,-7624,-7164,-6191,-5362,-6116,-8188,-1044,-2998,-5308,-3141,-2517,-2730,-2184,-58,-1206,-2335,-5178,59,30,153,51,9,28,9,1,0,14,14,23790,23787,23734,23550,23449,23547,23583,23477,23353,23357,23172,23148,13.390732502,13.219852954,13.258878327,13.141383489,12.902841816,13.212774032,13.056697028,13.122186672,12.766021169,12.794954398,7.6223581527,7.2720651341,7.3000177506,7.2777773899,7.2650508883,7.2744770049,7.7671123911,7.4717478057,7.8330708583,8.4234801702,5.7683743493,5.9477878202,5.9588605763,5.8636060987,5.6377909281,5.9382970273,5.2895846368,5.6504388666,4.9329503111,4.3714742276,5.1491055325,4.3064479572,4.5757127124,4.3846926748,6.1975177004,6.2893915771,7.7130343741,5.2023092445,4.718311441,3.7562481944,-8.969204119,-11.06535563,-8.572462888,-7.579907343,-9.654653647,-9.047630775,-7.785976816,-6.711930262,-7.632158893,-10.21799343,-3.820098586,-6.758907675,-3.996750175,-3.195214668,-3.457135946,-2.758239198,-0.072942441,-1.509621018,-2.913847452,-6.461745233 +050,1,2,34,015,New Jersey,Gloucester County,288288,288763,289158,289703,289839,289935,290742,291022,290795,291088,291754,291842,293245,395,545,136,96,807,280,-227,293,666,88,1403,861,3152,3126,2968,3022,2979,2784,2937,2908,2760,2719,509,2406,2370,2587,2555,2512,2540,2751,2812,2816,2937,352,746,756,381,467,467,244,186,96,-56,-218,54,203,190,230,193,236,246,279,208,98,109,18,-399,-796,-493,196,-399,-711,-160,375,45,1509,72,-196,-606,-263,389,-163,-465,119,583,143,1618,-29,-5,-14,-22,-49,-24,-6,-12,-13,1,3,4223,4223,4223,4223,4227,4229,4232,4231,4235,4236,4237,4238,10.890351915,10.78782901,10.238472232,10.408540376,10.241266218,9.5700194391,10.094812875,9.9786906228,9.4585980713,9.2943442599,8.3128764937,8.1788722819,8.924167003,8.8000730182,8.6358042093,8.7312677354,9.4555090972,9.6492702997,9.6505116553,10.039532582,2.5774754216,2.6089567279,1.3143052293,1.6084673579,1.6054620086,0.8387517037,0.6393037776,0.3294203232,-0.191913584,-0.745188322,0.70137736,0.6556901829,0.7934126056,0.6647413278,0.8113255547,0.8456267177,0.9589556663,0.7137440335,0.3358487721,0.3725941612,-1.378569294,-2.746996766,-1.700662672,0.6750740945,-1.371690239,-2.444067465,-0.549938733,1.2867981374,0.1542162729,5.158207241,-0.677191934,-2.091306583,-0.907250066,1.3398154223,-0.560364684,-1.598440747,0.409016933,2.0005421709,0.490065045,5.5308014022 +050,1,2,34,017,New Jersey,Hudson County,634266,634281,635648,645658,652373,657101,660312,664595,668673,672858,672390,674030,671666,1367,10010,6715,4728,3211,4283,4078,4185,-468,1640,-2364,2429,10341,10274,10353,10272,10237,10453,10189,10291,10143,10142,899,3880,3672,3882,3750,3712,3672,3735,3807,3936,4459,1530,6461,6602,6471,6522,6525,6781,6454,6484,6207,5683,1386,7046,5838,6042,6641,9022,8388,9783,5755,5861,4638,-1573,-3498,-5697,-7824,-10092,-11343,-11111,-12053,-12700,-10387,-12630,-187,3548,141,-1782,-3451,-2321,-2723,-2270,-6945,-4526,-7992,24,1,-28,39,140,79,20,1,-7,-41,-55,9378,9378,9391,9410,9411,9417,9443,9487,9490,9482,9495,9488,16.141343286,15.830130405,15.812455994,15.59419863,15.453160109,15.680268333,15.190107422,15.299781156,15.066621114,15.07324091,6.0563206603,5.6578001604,5.9290982486,5.6929755513,5.603412164,5.5082699052,5.5682649152,5.6599229287,5.8466154692,6.6270539557,10.085022625,10.172330245,9.8833577452,9.9012230789,9.8497479446,10.171998428,9.6218425068,9.6398582269,9.2200056446,8.4461869546,10.998153447,8.9951626733,9.2281328228,10.08188017,13.619069112,12.582616548,14.584828826,8.556043198,8.7060501181,6.8930872946,-5.460054039,-8.777910543,-11.94983635,-15.3209358,-17.12271125,-16.6673167,-17.96902196,-18.88127691,-15.42906374,-18.7709557,5.5380994079,0.2172521303,-2.721703524,-5.239055634,-3.503642142,-4.08470015,-3.384193135,-10.32523371,-6.723013621,-11.8778684 +050,1,2,34,019,New Jersey,Hunterdon County,128349,127364,127323,127348,126658,126443,125902,125569,124976,125076,125265,125201,124797,-41,25,-690,-215,-541,-333,-593,100,189,-64,-404,243,985,925,839,918,900,930,931,993,946,973,234,839,815,870,896,911,864,954,881,913,1044,9,146,110,-31,22,-11,66,-23,112,33,-71,28,146,88,107,61,153,131,166,97,92,82,-75,-272,-908,-290,-638,-479,-793,-35,-14,-185,-410,-47,-126,-820,-183,-577,-326,-662,131,83,-93,-328,-3,5,20,-1,14,4,3,-8,-6,-4,-5,3571,3571,3929,3872,3960,3835,3839,3710,3774,3823,3891,3842,7.7354704697,7.2832925206,6.6297644024,7.2757534328,7.1578830163,7.4238160809,7.4464511382,7.9331791436,7.5539194941,7.7840622725,6.5888931209,6.4171712479,6.8747258999,7.1013889714,7.2453682532,6.8969646171,7.6304128741,7.0383996229,7.2904106745,8.3520668165,1.1465773488,0.8661212727,-0.244961498,0.1743644614,-0.087485237,0.5268514638,-0.183961736,0.8947795207,0.2635088196,-0.568004544,1.1465773488,0.6928970182,0.8455122659,0.4834650974,1.2168401128,1.0457203297,1.3277238334,0.7749429778,0.7346306485,0.656005248,-2.136089307,-7.149437415,-2.2915753,-5.056569379,-3.809584405,-6.330200164,-0.279941772,-0.11184744,-1.477246413,-3.28002624,-0.989511959,-6.456540397,-1.446063034,-4.573104282,-2.592744293,-5.284479834,1.0477820613,0.6630955377,-0.742615764,-2.624020992 +050,1,2,34,021,New Jersey,Mercer County,366513,367485,367717,367407,368628,369534,369031,368266,367929,368489,368720,368047,367239,232,-310,1221,906,-503,-765,-337,560,231,-673,-808,1053,4384,4175,4214,4161,4161,4145,4092,3983,3951,3920,718,2951,2809,2811,2836,3020,2842,2919,2883,3031,3219,335,1433,1366,1403,1325,1141,1303,1173,1100,920,701,392,1760,1429,1642,1771,2245,2211,2574,1665,1408,1184,-493,-3523,-1532,-2139,-3660,-4188,-3868,-3202,-2543,-3014,-2707,-101,-1763,-103,-497,-1889,-1943,-1657,-628,-878,-1606,-1523,-2,20,-42,0,61,37,17,15,9,13,14,19803,19801,19257,20510,20757,20604,20450,20511,20266,20366,19772,19977,11.927239486,11.344569212,11.41754791,11.267796335,11.287174639,11.260603509,11.113253614,10.805619573,10.725236065,10.662517714,8.0285774917,7.6327892016,7.6162143269,7.6797573673,8.1920854147,7.7207804997,7.9275628787,7.8213912201,8.2278386518,8.7557766638,3.8986619944,3.7117800105,3.8013335826,3.5880389675,3.0950892246,3.5398230088,3.1856907354,2.9842283532,2.4973974133,1.9067410504,4.7883078229,3.8829675219,4.4488879135,4.7957864237,6.0898118397,6.0065607618,6.9905950153,4.5170365527,3.8221038673,3.2205155545,-9.584777534,-4.162845517,-5.79547579,-9.911111412,-11.36041514,-10.50808549,-8.696148112,-6.898993366,-8.181691091,-7.363121289,-4.796469711,-0.279877995,-1.346587876,-5.115324988,-5.270603298,-4.501524732,-1.705553096,-2.381956813,-4.359587224,-4.142605734 +050,1,2,34,023,New Jersey,Middlesex County,809858,810099,810813,815253,819389,821811,824331,825471,825298,826972,825677,824394,822736,714,4440,4136,2422,2520,1140,-173,1674,-1295,-1283,-1658,2484,10092,9957,9749,9460,9585,9374,9373,9074,8856,8607,1379,5756,5472,5827,5710,5830,5705,6062,6033,6247,6707,1105,4336,4485,3922,3750,3755,3669,3311,3041,2609,1900,979,5300,4081,4106,4609,6365,5922,6668,3504,3511,2837,-1402,-5214,-4424,-5645,-5873,-9059,-9805,-8349,-7880,-7427,-6424,-423,86,-343,-1539,-1264,-2694,-3883,-1681,-4376,-3916,-3587,32,18,-6,39,34,79,41,44,40,24,29,23835,23823,23864,23770,23688,23598,23329,23265,23123,23103,23029,23006,12.412780293,12.182483993,11.880331465,11.493540654,11.619576167,11.357131131,11.345603321,10.981158129,10.734083564,10.450905514,7.0796634331,6.6950439301,7.1009017792,6.9374331012,7.0675147684,6.9119301368,7.3377837763,7.3010058397,7.5717953955,8.1438623545,5.33311686,5.4874400633,4.7794296856,4.5561075533,4.5520613989,4.4452009942,4.0078195452,3.6801522888,3.1622881682,2.3070431599,6.5188005899,4.9931422293,5.0036558616,5.5997599235,7.7160774444,7.1748379089,8.0713200627,4.2404648537,4.2555744571,3.4447797077,-6.413023826,-5.412805984,-6.879112844,-7.135471909,-10.98192389,-11.87931201,-10.10609646,-9.536205208,-9.002036882,-7.800234347,0.1057767643,-0.419663755,-1.875456983,-1.535711986,-3.265846447,-4.704474097,-2.034776399,-5.295740354,-4.746462425,-4.355454639 +050,1,2,34,025,New Jersey,Monmouth County,630380,630347,630454,629144,627682,626964,625581,624180,623055,622122,620859,619687,618381,107,-1310,-1462,-718,-1383,-1401,-1125,-933,-1263,-1172,-1306,1608,6235,6221,6005,5996,5778,5900,5741,5715,5906,5799,1347,5390,5125,5479,5174,5490,5248,5481,5658,5872,6241,261,845,1096,526,822,288,652,260,57,34,-442,202,702,399,513,494,732,626,690,294,198,164,-328,-2864,-2994,-1756,-2699,-2407,-2395,-1874,-1608,-1407,-1032,-126,-2162,-2595,-1243,-2205,-1675,-1769,-1184,-1314,-1209,-868,-28,7,37,-1,0,-14,-8,-9,-6,3,4,7670,7487,7118,7093,7106,7001,7080,7066,6803,6745,6725,6654,9.8999839631,9.8995405888,9.5724212248,9.5741071179,9.2465679438,9.4609275718,9.221178997,9.1956353315,9.52161387,9.3678214767,8.5582860563,8.1554646387,8.7339377004,8.2615794243,8.785679822,8.4154148978,8.8035676856,9.1039203335,9.4667992964,10.081837185,1.3416979068,1.7440759501,0.8384835244,1.3125276936,0.4608881218,1.045512674,0.4176113115,0.0917149981,0.0548145736,-0.714015708,1.114641338,0.6349327592,0.8177605476,0.7887940154,1.1714239763,1.0038204508,1.1082761728,0.4730563058,0.3192142815,0.2649289054,-4.54748261,-4.764382659,-2.799195948,-4.309625602,-3.85193649,-3.840495175,-3.010013837,-2.587328366,-2.26835603,-1.6671136,-3.432841272,-4.1294499,-1.981435401,-3.520831587,-2.680512514,-2.836674724,-1.901737665,-2.11427206,-1.949141749,-1.402184694 +050,1,2,34,027,New Jersey,Morris County,492276,492281,492623,494801,495623,496050,494931,494370,493831,493994,493084,491577,491087,342,2178,822,427,-1119,-561,-539,163,-910,-1507,-490,1267,4818,4618,4595,4669,4741,4653,4693,4678,4478,4419,886,3611,3636,3776,3805,3744,3678,3837,4017,3999,4204,381,1207,982,819,864,997,975,856,661,479,215,308,1443,1121,1084,1039,1509,1343,1546,788,683,570,-326,-458,-1233,-1451,-3050,-3077,-2860,-2239,-2365,-2674,-1282,-18,985,-112,-367,-2011,-1568,-1517,-693,-1577,-1991,-712,-21,-14,-48,-25,28,10,3,0,6,5,7,8866,8866,8869,8869,8943,8830,8807,8726,8609,8578,8398,8587,9.7587257348,9.3252990638,9.2671677055,9.4229859099,9.5845450475,9.4171125105,9.5016829904,9.4784809306,9.0955161218,8.9939185724,7.3139806203,7.3423099602,7.6154135486,7.6792592391,7.5689805226,7.4438297472,7.7685824918,8.1391744117,8.1225924455,8.5563325816,2.4447451146,1.9829891037,1.6517541569,1.7437266708,2.0155645249,1.9732827633,1.7331004986,1.3393065188,0.9729236763,0.4375859907,2.9227565868,2.2636769707,2.1862045251,2.0969120498,3.0506387844,2.718070514,3.130109078,1.5966316745,1.3872794799,1.1601116964,-0.927666332,-2.489842734,-2.926367865,-6.155516604,-6.220553704,-5.788296106,-4.533191608,-4.791921206,-5.431310878,-2.609233675,1.995090255,-0.226165763,-0.74016334,-4.058604554,-3.16991492,-3.070225592,-1.40308253,-3.195289531,-4.044031398,-1.449121979 +050,1,2,34,029,New Jersey,Ocean County,576567,576554,577574,578922,580013,582166,584563,587238,591142,595564,601649,607498,614237,1020,1348,1091,2153,2397,2675,3904,4422,6085,5849,6739,1956,8113,7965,8144,8141,8510,8644,8535,8815,9032,9040,1635,7249,6982,7175,6939,7229,7210,7449,7357,7358,7815,321,864,983,969,1202,1281,1434,1086,1458,1674,1225,97,221,172,208,296,430,402,296,106,-2,5,637,308,83,1047,1010,1046,2108,3068,4541,4196,5529,734,529,255,1255,1306,1476,2510,3364,4647,4194,5534,-35,-45,-147,-71,-111,-82,-40,-28,-20,-19,-20,7163,7164,7134,7228,7238,7241,7250,7248,7241,7241,7240,7240,14.030312254,13.7453783,14.015052759,13.955254391,14.524650517,14.670988985,14.384354676,14.725867494,14.93945732,14.798626543,12.536143662,12.048993257,12.347495523,11.89479305,12.338272454,12.237139123,12.554078264,12.290210681,12.170563215,12.793281685,1.494168592,1.6963850432,1.6675572352,2.0604613411,2.1863780625,2.4338498617,1.8302764122,2.4356568129,2.7688941047,2.0053448579,0.382188957,0.2968242395,0.3579483023,0.5074014617,0.7339130108,0.682292639,0.4988598693,0.1770779302,-0.003308117,0.0081850811,0.5326434333,0.1432349528,1.8017878485,1.7313360686,1.7852860682,3.5777932416,5.1706151313,7.5859517062,6.9404299064,9.0510626281,0.9148323903,0.4400591923,2.1597361508,2.2387375303,2.519199079,4.2600858806,5.6694750005,7.7630296363,6.9371217892,9.0592477092 +050,1,2,34,031,New Jersey,Passaic County,501226,501595,502010,503257,503531,503815,504483,504556,504001,504403,503192,501838,500382,415,1247,274,284,668,73,-555,402,-1211,-1354,-1456,1813,7143,7068,6917,6921,6953,6884,6847,6684,6486,6378,834,3646,3490,3682,3562,3736,3603,3745,3786,3872,4130,979,3497,3578,3235,3359,3217,3281,3102,2898,2614,2248,457,2502,2012,2180,2167,3207,3141,3609,2497,1995,1662,-1048,-4772,-5398,-5189,-4916,-6393,-6999,-6327,-6621,-5961,-5366,-591,-2270,-3386,-3009,-2749,-3186,-3858,-2718,-4124,-3966,-3704,27,20,82,58,58,42,22,18,15,-2,0,11019,11019,11097,11231,11091,11071,11012,11006,10604,10213,10155,10155,14.211149874,14.040691784,13.733116526,13.728084356,13.781429657,13.651186795,13.579874733,13.267235348,12.907077401,12.727744407,7.2537942656,6.9329392087,7.3102985469,7.0653715469,7.4050656119,7.1448614208,7.4275786292,7.5149241511,7.7052426296,8.2417034184,6.957355608,7.1077525755,6.4228179791,6.6627128091,6.3763640454,6.5063253738,6.1522961035,5.7523111965,5.2018347711,4.486040989,4.9777820221,3.9968692515,4.328205006,4.2983324374,6.356543206,6.2287010055,7.1578454667,4.9563564726,3.9700307454,3.3166370657,-9.493995128,-10.72321084,-10.30231916,-9.751085493,-12.67146265,-13.87923538,-12.54854205,-13.1421851,-11.86233247,-10.70822773,-4.516213106,-6.726341593,-5.974114157,-5.452753055,-6.314919443,-7.650534377,-5.390696586,-8.185828632,-7.892301722,-7.391590669 +050,1,2,34,033,New Jersey,Salem County,66083,66072,65983,65880,65427,64801,64342,63754,63256,62944,62776,62341,62451,-89,-103,-453,-626,-459,-588,-498,-312,-168,-435,110,202,728,718,697,671,667,664,664,672,630,597,204,700,695,716,712,711,752,768,746,761,803,-2,28,23,-19,-41,-44,-88,-104,-74,-131,-206,6,25,6,23,55,89,97,81,118,-8,28,-94,-154,-490,-645,-478,-636,-509,-287,-213,-296,289,-88,-129,-484,-622,-423,-547,-412,-206,-95,-304,317,1,-2,8,15,5,3,2,-2,1,0,-1,1257,1257,1257,1257,1257,1257,1257,1257,1258,1258,1258,1258,11.041763042,10.936202944,10.704303222,10.391581425,10.414064452,10.455869617,10.522979398,10.690423163,10.070573943,9.5679210206,10.617079848,10.585878894,10.996099149,11.026536475,11.101049213,11.841587277,12.171156894,11.86764238,12.164613921,12.869414706,0.4246831939,0.3503240497,-0.291795927,-0.63495505,-0.686984761,-1.38571766,-1.648177496,-1.177219217,-2.094039979,-3.301493685,0.3791814231,0.0913888825,0.3532266486,0.8517689693,1.3895828129,1.5274387843,1.2836767036,1.8771874006,-0.127880304,0.4487467145,-2.335757567,-7.463425408,-9.905703842,-7.402646678,-9.930052461,-8.01511692,-4.548335975,-3.388482342,-4.731571249,4.6317071607,-1.956576143,-7.372036525,-9.552477194,-6.550877709,-8.540469648,-6.487678136,-3.264659271,-1.511294941,-4.859451553,5.0804538752 +050,1,2,34,035,New Jersey,Somerset County,323444,323476,324120,326277,327462,329052,329378,329682,330003,330650,330772,329998,329331,644,2157,1185,1590,326,304,321,647,122,-774,-667,849,3653,3398,3441,3320,3445,3361,3169,3185,3200,3139,456,2180,2209,2301,2291,2367,2394,2421,2427,2557,2783,393,1473,1189,1140,1029,1078,967,748,758,643,356,249,1095,886,936,879,1240,1165,1347,588,648,491,33,-410,-875,-460,-1575,-2018,-1811,-1452,-1227,-2077,-1515,282,685,11,476,-696,-778,-646,-105,-639,-1429,-1024,-31,-1,-15,-26,-7,4,0,4,3,12,1,3970,3969,4689,4696,4684,4742,4770,4762,5349,5353,5432,5436,11.233139144,10.395586006,10.482640126,10.084595173,10.454283373,10.189711756,9.5935385142,9.6307652301,9.6856697489,9.5218017105,6.7035979563,6.7580487014,7.0097515057,6.9589781754,7.1829575456,7.2580095045,7.3291122571,7.338733819,7.7394554838,8.4419159479,4.5295411879,3.6375373046,3.4728886208,3.125616998,3.2713258277,2.9317022518,2.2644262571,2.2920314111,1.9462142652,1.0798857626,3.3671742028,2.7105618603,2.8514243413,2.669987698,3.7629350894,3.5319887522,4.0777836474,1.7779874271,1.9613481242,1.4893930041,-1.260768423,-2.676909286,-1.401341022,-4.78410765,-6.123873395,-5.490499253,-4.39565097,-3.710188049,-6.286605021,-4.595581265,2.1064057799,0.0336525739,1.4500833189,-2.114119952,-2.360938306,-1.958510501,-0.317867322,-1.932200622,-4.325256897,-3.106188261 +050,1,2,34,037,New Jersey,Sussex County,149265,148941,148859,148185,147003,145672,144639,143059,142004,141267,140995,140710,140002,-82,-674,-1182,-1331,-1033,-1580,-1055,-737,-272,-285,-708,382,1333,1319,1254,1223,1184,1181,1135,1214,1220,1210,287,1109,1125,1133,1206,1171,1155,1212,1243,1318,1378,95,224,194,121,17,13,26,-77,-29,-98,-168,21,101,55,44,26,46,28,45,5,-4,14,-200,-1004,-1470,-1528,-1098,-1656,-1114,-705,-244,-185,-555,-179,-903,-1415,-1484,-1072,-1610,-1086,-660,-239,-189,-541,2,5,39,32,22,17,5,0,-4,2,1,1742,1742,1742,1742,1742,1742,1743,1743,1693,1693,1661,1662,8.9751013318,8.9366776427,8.5692320834,8.4254471928,8.2308531863,8.285887681,8.013527682,8.6019372073,8.6615431036,8.6209353359,7.4669072595,7.6222610675,7.742376356,8.3083314101,8.1404806429,8.1034718641,8.5571766965,8.8074200565,9.3573064021,9.817891647,1.5081940723,1.3144165752,0.8268557273,0.1171157827,0.0903725434,0.1824158169,-0.543649015,-0.205482849,-0.695763298,-1.196956311,0.6800339344,0.3726438744,0.3006748099,0.1791182559,0.3197797691,0.1964478028,0.3177169566,0.0354280775,-0.028398502,0.0997463593,-6.759941288,-9.959754462,-10.44161613,-7.564301732,-11.51207169,-7.815816153,-4.977565653,-1.72889018,-1.313430717,-3.954230671,-6.079907354,-9.587110587,-10.14094132,-7.385183476,-11.19229192,-7.61936835,-4.659848696,-1.693462103,-1.341829219,-3.854484311 +050,1,2,34,039,New Jersey,Union County,536499,536426,537336,539918,542977,546051,548052,549954,552814,554695,556475,556664,555394,910,2582,3059,3074,2001,1902,2860,1881,1780,189,-1270,1739,6985,6780,6745,6868,6777,6891,6697,6845,6752,6643,1016,3938,3907,4029,3772,3984,3811,3931,4022,4099,4423,723,3047,2873,2716,3096,2793,3080,2766,2823,2653,2220,568,2805,2167,2324,2371,3229,3089,3688,2424,2188,1735,-332,-3275,-1913,-1906,-3466,-4123,-3311,-4578,-3479,-4663,-5241,236,-470,254,418,-1095,-894,-222,-890,-1055,-2475,-3506,-49,5,-68,-60,0,3,2,5,12,11,16,6804,6805,6807,6806,6810,6814,6817,6800,6496,6394,6162,6158,12.968157927,12.521989667,12.387192983,12.554576671,12.34419484,12.497642296,12.093806913,12.320347022,12.131458874,11.94721858,7.3111819497,7.2158427179,7.3992587886,6.8951460694,7.2567909465,6.9116985622,7.098813644,7.2392163215,7.3647585791,7.9546210719,5.6569759778,5.3061469487,4.9879341945,5.6594306021,5.087403894,5.5859437343,4.9949932687,5.0811307001,4.7667002953,3.9925975084,5.2076854669,4.0022347504,4.2680261665,4.3341440431,5.8815707747,5.6022662972,6.6599910249,4.3629687627,3.931225121,3.1203408455,-6.080274476,-3.533121863,-3.500369137,-6.335783742,-7.509977177,-6.004889514,-8.26720144,-6.261868121,-8.378109113,-9.425767361,-0.872589009,0.4691128872,0.7676570299,-2.001639699,-1.628406402,-0.402623217,-1.607210415,-1.898899358,-4.446883992,-6.305426516 +050,1,2,34,041,New Jersey,Warren County,108692,108639,108572,108154,107586,106933,107022,106787,106102,105761,105709,105455,105624,-67,-418,-568,-653,89,-235,-685,-341,-52,-254,169,251,1002,1001,944,1031,856,865,911,1013,973,1008,260,960,932,1005,884,993,996,1084,1008,1026,1065,-9,42,69,-61,147,-137,-131,-173,5,-53,-57,31,141,125,144,153,195,161,189,135,84,88,-83,-600,-772,-744,-199,-284,-717,-353,-191,-284,134,-52,-459,-647,-600,-46,-89,-556,-164,-56,-200,222,-6,-1,10,8,-12,-9,2,-4,-1,-1,4,1968,1968,1968,1968,1969,1968,1971,1971,1974,1975,1975,1976,9.2466985964,9.279688514,8.8010852186,9.6375406043,8.0071465654,8.1263005604,8.5998971033,9.5805551615,9.21558599,9.5509264304,8.8591124277,8.6400296653,9.3697994117,8.263419878,9.2886641816,9.3569888533,10.233027947,9.5332671301,9.7175654941,10.09100858,0.3875861687,0.6396588486,-0.568714193,1.3741207263,-1.281517616,-1.230688293,-1.633130844,0.0472880314,-0.501979504,-0.540082149,1.3011821378,1.158802262,1.3425384232,1.4302072866,1.8240579209,1.5125253066,1.7841718469,1.2767768478,0.7955901574,0.8338110376,-5.536945267,-7.15676277,-6.93644852,-1.860204249,-2.656576664,-6.735904626,-3.332342127,-1.806402799,-2.689852437,1.2696668072,-4.235763129,-5.997960508,-5.593910097,-0.429996962,-0.832518743,-5.22337932,-1.54817028,-0.529625952,-1.89426228,2.1034778448 +040,4,8,35,000,New Mexico,New Mexico,2059179,2059199,2064614,2080707,2087715,2092833,2090236,2090071,2092555,2092844,2093754,2099634,2106319,5415,16093,7008,5118,-2597,-165,2484,289,910,5880,6685,6662,27799,27035,26731,26359,26037,25216,24179,23198,23101,22671,3834,16367,16466,16789,17138,17631,18136,18527,18791,18868,19912,2828,11432,10569,9942,9221,8406,7080,5652,4407,4233,2759,450,4176,3810,5710,1913,3874,2609,2251,1623,3334,2687,2051,499,-7260,-10597,-13805,-12434,-7157,-7582,-5068,-1671,1221,2501,4675,-3450,-4887,-11892,-8560,-4548,-5331,-3445,1663,3908,86,-14,-111,63,74,-11,-48,-32,-52,-16,18,42629,42665,42670,43079,43189,43063,42892,42967,42886,42817,42959,42967,13.412230319,12.971335436,12.788275604,12.602708681,12.456979834,12.057496893,11.553976096,11.082028893,11.017821389,10.780434303,7.8966140379,7.9003517398,8.0319613601,8.1939838908,8.4352656396,8.6720639139,8.8531583249,8.9767395867,8.9989287898,9.4684843126,5.5156162816,5.070983696,4.756314244,4.4087247903,4.0217141947,3.3854329792,2.7008177715,2.1052893065,2.0188925995,1.3119499909,2.0148017488,1.8280298876,2.7316992892,0.9146394669,1.85345239,1.2475416162,1.075644162,0.7753311878,1.5901223545,1.2777128037,0.2407533699,-3.483332542,-5.069670292,-6.600417062,-5.948845384,-3.422251954,-3.62307154,-2.421058817,-0.796968943,0.5806056321,2.2555551187,-1.655302654,-2.337971003,-5.685777595,-4.095392994,-2.174710337,-2.547427378,-1.645727629,0.793153412,1.8583184358 +050,4,8,35,001,New Mexico,Bernalillo County,662564,662469,663940,670356,673725,676467,676120,676440,677883,678280,677929,679425,681666,1471,6416,3369,2742,-347,320,1443,397,-351,1496,2241,2132,8437,8470,8268,8086,7936,7708,7349,7240,7048,6931,1165,5048,4968,5092,5231,5472,5595,5755,5811,6020,6443,967,3389,3502,3176,2855,2464,2113,1594,1429,1028,488,196,1695,1503,2044,701,1340,1053,785,718,1241,991,349,1346,-1488,-2407,-3834,-3444,-1686,-1948,-2476,-777,738,545,3041,15,-363,-3133,-2104,-633,-1163,-1758,464,1729,-41,-14,-148,-71,-69,-40,-37,-34,-22,4,24,11945,11959,11992,11963,11951,11957,11939,11927,11847,11741,11875,11882,12.646369321,12.603407086,12.247147072,11.956347355,11.734784409,11.382808975,10.837930249,10.676820461,10.384910642,10.184477011,7.5665369603,7.392411618,7.542630974,7.7348074468,8.0913231206,8.2624307495,8.4871803758,8.5694756487,8.8701989312,9.4674051919,5.079832361,5.2109954683,4.7045160985,4.2215399083,3.6434612882,3.1203782259,2.350749873,2.1073448119,1.5147117112,0.7170718196,2.5406656394,2.2364723555,3.0277175394,1.0365322157,1.981427811,1.5550204789,1.1576779487,1.0588338523,1.8285576202,1.4561847812,2.0175433337,-2.214152272,-3.565418844,-5.669136255,-5.09256521,-2.489804869,-2.872811012,-3.651354622,-1.144874513,1.0844241862,4.5582089731,0.0223200834,-0.537701305,-4.63260404,-3.111137399,-0.93478439,-1.715133063,-2.592520769,0.683683107,2.5406089674 +050,4,8,35,003,New Mexico,Catron County,3725,3727,3748,3716,3634,3586,3550,3480,3525,3557,3523,3507,3623,21,-32,-82,-48,-36,-70,45,32,-34,-16,116,1,16,28,18,24,25,22,12,18,11,11,3,42,39,47,31,42,39,41,47,40,30,-2,-26,-11,-29,-7,-17,-17,-29,-29,-29,-19,0,0,-1,1,0,0,0,0,0,0,0,21,-5,-72,-19,-29,-53,61,62,-4,13,136,21,-5,-73,-18,-29,-53,61,62,-4,13,136,2,-1,2,-1,0,0,1,-1,-1,0,-1,106,106,106,106,106,106,106,106,106,106,106,106,4.2872454448,7.619047619,4.9861495845,6.7264573991,7.1123755334,6.2812276945,3.3888731997,5.0847457627,3.1294452347,3.0855539972,11.254019293,10.612244898,13.019390582,8.6883408072,11.948790896,11.13490364,11.578650099,13.276836158,11.379800853,8.4151472651,-6.966773848,-2.993197279,-8.033240997,-1.961883408,-4.836415363,-4.853675946,-8.189776899,-8.192090395,-8.250355619,-5.329593268,0,-0.272108844,0.2770083102,0,0,0,0,0,0,0,-1.339764202,-19.59183673,-5.263157895,-8.127802691,-15.07823613,17.416131335,17.509178198,-1.129943503,3.6984352774,38.148667602,-1.339764202,-19.86394558,-4.986149584,-8.127802691,-15.07823613,17.416131335,17.509178198,-1.129943503,3.6984352774,38.148667602 +050,4,8,35,005,New Mexico,Chaves County,65645,65648,65721,65721,65780,66033,65839,65856,65684,65091,64488,64586,64711,73,0,59,253,-194,17,-172,-593,-603,98,125,234,956,918,947,948,915,917,858,841,816,798,182,663,652,644,659,636,648,709,669,659,677,52,293,266,303,289,279,269,149,172,157,121,3,61,18,96,20,131,63,81,17,100,91,26,-353,-215,-138,-505,-391,-503,-828,-794,-159,-90,29,-292,-197,-42,-485,-260,-440,-747,-777,-59,1,-8,-1,-10,-8,2,-2,-1,5,2,0,3,1784,1785,1785,1785,1786,1786,1782,1783,1781,1779,1776,1776,14.54633983,13.961871012,14.368840706,14.377578258,13.895743954,13.942526988,13.121774039,12.980498383,12.643909695,12.343673867,10.088099694,9.916274401,9.7714186006,9.9945401602,9.6586810433,9.8525163448,10.843051042,10.325747228,10.211196678,10.472014045,4.4582401363,4.0455966114,4.5974221056,4.3830380975,4.2370629105,4.0900106432,2.2787229975,2.6547511557,2.4327130173,1.871659822,0.9281660352,0.2737621767,1.4566089839,0.3033244358,1.9894453092,0.9578835335,1.2387688778,0.2623881956,1.5494987372,1.4076119322,-5.371190335,-3.269937111,-2.093875414,-7.658942004,-5.937962717,-7.647863768,-12.66297075,-12.2550722,-2.463702992,-1.392143669,-4.4430243,-2.996174934,-0.63726643,-7.355617569,-3.948517408,-6.689980234,-11.42420187,-11.992684,-0.914204255,0.015468263 +050,4,8,35,006,New Mexico,Cibola County,27213,27218,27319,27492,27421,27414,27156,27046,27061,26921,26797,26681,26354,101,173,-71,-7,-258,-110,15,-140,-124,-116,-327,105,426,372,419,416,347,345,314,315,291,297,34,262,224,271,268,256,289,240,270,278,298,71,164,148,148,148,91,56,74,45,13,-1,6,22,34,59,12,13,14,13,18,20,16,23,-13,-260,-212,-426,-214,-54,-228,-187,-149,-339,29,9,-226,-153,-414,-201,-40,-215,-169,-129,-323,1,0,7,-2,8,0,-1,1,0,0,-3,2531,2548,2549,2559,2559,2557,2557,2576,2573,2574,2570,2569,15.544325044,13.548704314,15.282210267,15.246472421,12.803955574,12.752508918,11.633507465,11.727912432,10.882979917,11.200150844,9.5601247925,8.158359587,9.8841980487,9.8222466557,9.4461458987,10.682536456,8.8918528398,10.05249637,10.396798684,11.237861789,5.9842002518,5.3903447271,5.3980122185,5.4242257651,3.3578096749,2.069972462,2.7416546256,1.6754160617,0.4861812334,-0.037710946,0.8027585704,1.2383224373,2.1519102763,0.4398020891,0.4796870964,0.5174931155,0.4816420288,0.6701664247,0.7479711283,0.6033751296,-0.474357337,-9.469524521,-7.732287772,-15.61297416,-7.896387587,-1.996044874,-8.447260198,-6.962284523,-5.572384906,-12.78401056,0.3284012333,-8.231202083,-5.580377496,-15.17317207,-7.416700491,-1.478551759,-7.965618169,-6.292118098,-4.824413778,-12.18063543 +050,4,8,35,007,New Mexico,Colfax County,13750,13751,13725,13620,13245,13067,12703,12434,12261,12178,12097,12068,11927,-26,-105,-375,-178,-364,-269,-173,-83,-81,-29,-141,30,136,136,127,137,132,113,119,100,113,109,33,132,170,153,167,137,163,150,134,112,150,-3,4,-34,-26,-30,-5,-50,-31,-34,1,-41,2,33,11,20,6,7,9,12,8,18,12,-24,-143,-362,-173,-352,-273,-131,-62,-55,-46,-112,-22,-110,-351,-153,-346,-266,-122,-50,-47,-28,-100,-1,1,10,1,12,2,-1,-2,0,-2,0,408,408,408,408,408,408,408,408,408,408,408,408,9.9469738526,10.124697562,9.6533900882,10.632518432,10.502446593,9.1516501316,9.7385326732,8.2389289392,9.3523691289,9.0852260888,9.6544157981,12.655871952,11.629674673,12.96080714,10.900266539,13.201052845,12.275461353,11.040164779,9.2696048003,12.502604709,0.2925580545,-2.53117439,-1.976284585,-2.328288708,-0.397819947,-4.049402713,-2.53692868,-2.801235839,0.0827643286,-3.417378621,2.4136039495,0.8189093616,1.5202189115,0.4656577416,0.5569479254,0.7288924884,0.9820369082,0.6591143151,1.4897579143,1.0002083767,-10.45895045,-26.94956263,-13.14989358,-27.3185875,-21.72096909,-10.60943511,-5.073857359,-4.531410917,-3.807159114,-9.335278183,-8.045346498,-26.13065327,-11.62967467,-26.85292976,-21.16402116,-9.88054262,-4.091820451,-3.872296601,-2.3174012,-8.335069806 +050,4,8,35,009,New Mexico,Curry County,48376,48376,48977,49836,50830,50810,51153,50344,50334,49889,49413,49083,48793,601,859,994,-20,343,-809,-10,-445,-476,-330,-290,216,953,948,909,959,896,873,866,828,810,802,65,372,388,386,358,442,423,419,416,387,399,151,581,560,523,601,454,450,447,412,423,403,55,191,414,315,128,228,94,54,-56,63,55,357,87,4,-867,-376,-1510,-552,-949,-832,-813,-743,412,278,418,-552,-248,-1282,-458,-895,-888,-750,-688,38,0,16,9,-10,19,-2,3,0,-3,-5,1041,1040,1016,1433,1485,1484,1506,1494,1505,1518,1502,1503,19.288959955,18.834561818,17.886658796,18.810745074,17.655694257,17.342418403,17.281462339,16.676401281,16.447368421,16.38808288,7.5293736654,7.7086603223,7.5954348682,7.0221550955,8.709617033,8.4030274737,8.3613541802,8.378481803,7.8581871345,8.1531734031,11.759586289,11.125901496,10.291223928,11.788589979,8.946077224,8.9393909295,8.9201081588,8.297919478,8.5891812865,8.2349094773,3.8658880916,8.2252200346,6.1983471074,2.510714671,4.4927436279,1.8673394386,1.0775969588,-1.12787255,1.2792397661,1.1238710205,1.7609019056,0.079470725,-17.06021251,-7.375224346,-29.75457403,-10.96565287,-18.93776878,-16.75696361,-16.5082846,-15.18247579,5.6267899973,8.3046907595,-10.86186541,-4.864509675,-25.2618304,-9.098313435,-17.86017182,-17.88483616,-15.22904483,-14.05860477 +050,4,8,35,011,New Mexico,De Baca County,2022,2024,2031,2001,1958,1931,1865,1877,1838,1810,1781,1741,1673,7,-30,-43,-27,-66,12,-39,-28,-29,-40,-68,7,23,20,10,12,19,14,13,14,10,10,1,18,31,38,35,27,35,27,25,17,22,6,5,-11,-28,-23,-8,-21,-14,-11,-7,-12,0,2,1,4,4,1,2,1,1,1,1,1,-37,-33,-4,-49,19,-21,-16,-17,-35,-57,1,-35,-32,0,-45,20,-19,-15,-16,-34,-56,0,0,0,1,2,0,1,1,-2,1,0,9,9,9,9,9,9,9,9,9,9,9,9,11.408730159,10.103561505,5.1427102083,6.3224446786,10.154997328,7.5370121131,7.1271929825,7.7972709552,5.6785917093,5.8582308143,8.9285714286,15.660520333,19.542298791,18.440463646,14.430785676,18.842530283,14.802631579,13.923698134,9.6536059057,12.888107791,2.4801587302,-5.556958828,-14.39958858,-12.11801897,-4.275788348,-11.30551817,-7.675438596,-6.126427179,-3.975014196,-7.029876977,0.9920634921,0.5051780753,2.0570840833,2.1074815595,0.5344735436,1.0767160162,0.548245614,0.5569479254,0.5678591709,0.5858230814,-18.3531746,-16.67087648,-2.057084083,-25.8166491,10.154997328,-11.30551817,-8.771929825,-9.468114731,-19.87507098,-33.39191564,-17.36111111,-16.16569841,0,-23.70916754,10.689470871,-10.22880215,-8.223684211,-8.911166806,-19.30721181,-32.80609256 +050,4,8,35,013,New Mexico,Doa Ana County,209233,209212,210096,213123,214452,214285,213938,214028,214664,216218,217470,218864,221262,884,3027,1329,-167,-347,90,636,1554,1252,1394,2398,747,3385,3147,3066,2932,2922,2824,2757,2533,2664,2598,398,1444,1494,1445,1524,1463,1537,1530,1624,1621,1777,349,1941,1653,1621,1408,1459,1287,1227,909,1043,821,-59,232,205,555,110,431,292,275,141,442,360,566,858,-502,-2374,-1883,-1802,-938,64,208,-96,1206,507,1090,-297,-1819,-1773,-1371,-646,339,349,346,1566,28,-4,-27,31,18,2,-5,-12,-6,5,11,4576,4580,4577,4556,4563,4525,4388,4390,4388,4428,4411,4412,15.996446284,14.720224522,14.302474477,13.693799726,13.655290374,13.174960111,12.797007069,11.681208611,12.210829319,11.805710183,6.8238902318,6.9882476758,6.740729165,7.1177867606,6.8369917236,7.170649324,7.1017123017,7.4892549483,7.4300879601,8.0749603523,9.1725560525,7.7319768462,7.5617453124,6.5760129652,6.8182986499,6.0043107872,5.6952947675,4.1919536625,4.7807413587,3.7307498307,1.0963590954,0.9588961001,2.5889997831,0.5137510129,2.0141786964,1.3622834109,1.2764515575,0.6502370368,2.0259709305,1.6358951755,4.0546383787,-2.34812606,-11.07438826,-8.794483248,-8.421229724,-4.37610219,0.2970650897,0.9592149195,-0.440029885,5.4802488378,5.1509974741,-1.38922996,-8.485388478,-8.280732235,-6.407051027,-3.013818779,1.5735166472,1.6094519562,1.5859410452,7.1161440133 +050,4,8,35,015,New Mexico,Eddy County,53829,53828,53912,54082,54437,55694,56720,57756,57669,57128,57718,58394,58418,84,170,355,1257,1026,1036,-87,-541,590,676,24,197,765,700,894,864,914,858,811,801,852,833,104,576,509,586,585,538,581,550,590,599,584,93,189,191,308,279,376,277,261,211,253,249,0,22,53,119,63,123,62,59,25,74,53,-2,-38,115,816,668,532,-427,-864,354,351,-284,-2,-16,168,935,731,655,-365,-805,379,425,-231,-7,-3,-4,14,16,5,1,3,0,-2,6,1000,1000,1000,1000,1000,1000,1000,1000,1000,1000,1000,1000,14.167453747,12.900966651,16.235210794,15.37175085,15.968412593,14.866796621,14.129289093,13.949114466,14.675485738,14.262233332,10.667259292,9.3808457505,10.641871952,10.407956304,9.3993500821,10.067143167,9.5821319372,10.274628633,10.317624363,9.9989727083,3.5001944552,3.5201209005,5.5933388419,4.9637945452,6.5690625109,4.7996534546,4.5471571557,3.6744858332,4.3578613752,4.2632606239,0.4074300424,0.976787475,2.1610627344,1.1208568328,2.1489220448,1.0742906649,1.027901426,0.43536562,1.2746313904,0.9074410163,-0.703742801,2.1194445212,14.818715893,11.884640703,9.2945246165,-7.398743773,-15.05265817,6.1647771799,6.0458867301,-4.862514125,-0.296312758,3.0962319962,16.979778627,13.005497536,11.443446661,-6.324453108,-14.02475674,6.6001427999,7.3205181204,-3.955073109 +050,4,8,35,017,New Mexico,Grant County,29514,29512,29386,29350,29260,29109,28876,28369,28061,27671,27274,26941,27007,-126,-36,-90,-151,-233,-507,-308,-390,-397,-333,66,94,320,324,295,320,302,302,266,266,249,233,114,320,370,330,308,332,368,351,310,374,368,-20,0,-46,-35,12,-30,-66,-85,-44,-125,-135,11,65,23,17,-3,-6,3,6,-2,6,7,-122,-99,-63,-128,-239,-474,-243,-309,-350,-212,195,-111,-34,-40,-111,-242,-480,-240,-303,-352,-206,202,5,-2,-4,-5,-3,3,-2,-2,-1,-2,-1,590,590,590,590,590,590,590,590,589,587,587,587,10.896213566,11.056133766,10.10810533,11.037337242,10.551139838,10.703526493,9.5456829111,9.6824096824,9.1856497279,8.6379476533,10.896213566,12.625831769,11.307372064,10.623437096,11.599266311,13.04270778,12.59599512,11.284011284,13.796919672,13.642767109,0,-1.569698004,-1.199266734,0.4139001466,-1.048126474,-2.339181287,-3.050312208,-1.601601602,-4.611269944,-5.004819456,2.2132933806,0.7848490019,0.5825009851,-0.103475037,-0.209625295,0.1063264221,0.2153161559,-0.072800073,0.2213409573,0.259509157,-3.371016072,-2.149803788,-4.38588977,-8.243511253,-16.56039829,-8.612440191,-11.08878203,-12.74001274,-7.820713825,7.2291836583,-1.157722691,-1.364954786,-3.803388785,-8.34698629,-16.77002358,-8.506113769,-10.87346587,-12.81281281,-7.599372867,7.4886928153 +050,4,8,35,019,New Mexico,Guadalupe County,4687,4688,4696,4626,4593,4536,4446,4355,4387,4418,4323,4278,4275,8,-70,-33,-57,-90,-91,32,31,-95,-45,-3,13,46,36,51,40,36,56,37,39,39,37,16,40,34,49,46,44,31,52,62,47,42,-3,6,2,2,-6,-8,25,-15,-23,-8,-5,0,0,-1,0,0,0,0,0,0,0,0,11,-78,-35,-61,-85,-83,6,46,-71,-36,1,11,-78,-36,-61,-85,-83,6,46,-71,-36,1,0,2,1,2,1,0,1,0,-1,-1,1,571,571,571,571,573,571,571,575,577,576,573,574,9.8691267968,7.8099576961,11.173184358,8.9067022935,8.1808885354,12.811713567,8.4043157297,8.9234641345,9.0687129404,8.6519349936,8.5818493885,7.3760711574,10.735020265,10.242707637,9.9988637655,7.0921985816,11.811470755,14.186019906,10.928961749,9.8211153981,1.2872774083,0.4338865387,0.4381640925,-1.336005344,-1.81797523,5.7195149851,-3.407155026,-5.262555772,-1.860248808,-1.169180405,0,-0.216943269,0,0,0,0,0,0,0,0,-16.73460631,-7.593014427,-13.36400482,-18.92674237,-18.86149301,1.3726835964,10.448608745,-16.24528086,-8.371119637,0.2338360809,-16.73460631,-7.809957696,-13.36400482,-18.92674237,-18.86149301,1.3726835964,10.448608745,-16.24528086,-8.371119637,0.2338360809 +050,4,8,35,021,New Mexico,Harding County,695,695,690,712,700,689,691,717,685,681,649,636,638,-5,22,-12,-11,2,26,-32,-4,-32,-13,2,1,4,5,7,5,3,5,3,2,3,2,3,14,7,6,5,7,9,8,10,8,4,-2,-10,-2,1,0,-4,-4,-5,-8,-5,-2,0,0,0,1,0,0,0,0,0,0,0,-3,31,-10,-13,2,29,-27,1,-24,-9,6,-3,31,-10,-12,2,29,-27,1,-24,-9,6,0,1,0,0,0,1,-1,0,0,1,-2,0,0,0,0,0,0,0,0,0,0,0,0,5.7061340942,7.0821529745,10.079193665,7.2463768116,4.2613636364,7.1326676177,4.39238653,3.007518797,4.6692607004,3.1397174254,19.97146933,9.9150141643,8.6393088553,7.2463768116,9.9431818182,12.838801712,11.713030747,15.037593985,12.451361868,6.2794348509,-14.26533524,-2.83286119,1.4398848092,0,-5.681818182,-5.706134094,-7.320644217,-12.03007519,-7.782101167,-3.139717425,0,0,1.4398848092,0,0,0,0,0,0,0,44.22253923,-14.16430595,-18.71850252,2.8985507246,41.193181818,-38.51640514,1.4641288433,-36.09022556,-14.0077821,9.4191522763,44.22253923,-14.16430595,-17.27861771,2.8985507246,41.193181818,-38.51640514,1.4641288433,-36.09022556,-14.0077821,9.4191522763 +050,4,8,35,023,New Mexico,Hidalgo County,4894,4898,4865,4845,4783,4627,4551,4441,4327,4303,4233,4203,4106,-33,-20,-62,-156,-76,-110,-114,-24,-70,-30,-97,12,54,63,60,47,58,58,61,51,35,39,1,35,53,50,51,51,54,52,66,41,50,11,19,10,10,-4,7,4,9,-15,-6,-11,0,0,1,3,1,4,1,1,1,1,1,-46,-38,-76,-176,-74,-121,-119,-35,-56,-23,-87,-46,-38,-75,-173,-73,-117,-118,-34,-55,-22,-86,2,-1,3,7,1,0,0,1,0,-2,0,64,64,64,64,64,64,64,64,64,64,64,64,11.122554068,13.086830079,12.752391073,10.241882763,12.900355872,13.229927007,14.136732329,11.949390815,8.2977714557,9.3874112408,7.2090628218,11.009555463,10.626992561,11.11353236,11.34341637,12.317518248,12.050984936,15.463917526,9.7202465624,12.035142616,3.9134912461,2.0772746157,2.1253985122,-0.871649597,1.5569395018,0.9124087591,2.0857473928,-3.51452671,-1.422475107,-2.647731376,0,0.2077274616,0.6376195537,0.2179123992,0.8896797153,0.2281021898,0.2317497103,0.2343017807,0.2370791844,0.2407028523,-7.826982492,-15.78728708,-37.40701382,-16.12551754,-26.91281139,-27.14416058,-8.111239861,-13.12089972,-5.452821242,-20.94114815,-7.826982492,-15.57955962,-36.76939426,-15.90760514,-26.02313167,-26.91605839,-7.879490151,-12.88659794,-5.215742058,-20.7004453 +050,4,8,35,025,New Mexico,Lea County,64727,64726,64598,65135,66374,68631,70178,71480,70275,69031,69538,71123,71830,-128,537,1239,2257,1547,1302,-1205,-1244,507,1585,707,247,1056,1132,1162,1162,1186,1154,1033,1041,1132,1130,194,514,518,512,546,539,526,552,506,599,550,53,542,614,650,616,647,628,481,535,533,580,16,159,96,271,49,193,97,132,42,140,114,-207,-164,524,1310,865,462,-1941,-1866,-70,914,10,-191,-5,620,1581,914,655,-1844,-1734,-28,1054,124,10,0,5,26,17,0,11,9,0,-2,3,2057,2058,2057,2064,2072,2068,2068,2074,2074,2074,2072,2068,16.279589619,17.215551787,17.214177253,16.742430246,16.744553784,16.281612642,14.83066056,15.025005593,16.095435124,15.809391898,7.9239669167,7.877787832,7.5849042628,7.8669250553,7.6098773101,7.4212549822,7.9249996411,7.3032207781,8.5169307768,7.6948367645,8.355622702,9.3377639553,9.6292729899,8.8755051906,9.1346764743,8.8603576593,6.9056609191,7.7217848148,7.5785043473,8.1145551335,2.4511882096,1.4599761233,4.0146661235,0.7060060947,2.7248725804,1.3685584283,1.8951086098,0.6061961911,1.9906015171,1.5949298021,-2.5282696,7.9690363397,19.406688641,12.463168815,6.5227519801,-27.38527742,-26.78994444,-1.010326985,12.99578419,0.139906123,-0.07708139,9.429012463,23.421354765,13.169174909,9.2476245606,-26.01671899,-24.89483583,-0.404130794,14.986385707,1.7348359251 +050,4,8,35,027,New Mexico,Lincoln County,20497,20493,20451,20411,20202,19987,19610,19365,19423,19502,19608,19730,19939,-42,-40,-209,-215,-377,-245,58,79,106,122,209,39,209,188,181,186,189,185,163,174,179,170,65,189,187,203,198,216,191,243,231,227,219,-26,20,1,-22,-12,-27,-6,-80,-57,-48,-49,-2,2,-7,9,6,43,35,49,20,58,47,-11,-61,-208,-202,-376,-263,30,111,144,113,213,-13,-59,-215,-193,-370,-220,65,160,164,171,260,-3,-1,5,0,5,2,-1,-1,-1,-1,-2,116,116,116,116,116,116,116,116,116,116,116,116,10.22955313,9.2581193214,9.0074398467,9.3946511099,9.6985246953,9.5390326905,8.3750802826,8.8979800563,9.1006151812,8.5709243994,9.2506485243,9.2088740059,10.102266789,10.000757633,11.084028223,9.8484067237,12.485549133,11.812835592,11.54100361,11.041367315,0.9789046057,0.0492453155,-1.094826943,-0.606106523,-1.385503528,-0.309374033,-4.11046885,-2.914855536,-2.440388428,-2.470442915,0.0978904606,-0.344717209,0.4478837493,0.3030532616,2.2065426555,1.8046818604,2.5176621708,1.0227563283,2.9488026844,2.3696085104,-2.985659048,-10.24302563,-10.05250193,-18.99133773,-13.49583066,1.546870166,5.7032755299,7.3638455638,5.7450810921,10.7388641,-2.887768587,-10.58774284,-9.604618179,-18.68828447,-11.28928801,3.3515520264,8.2209377007,8.3866018921,8.6938837765,13.108472611 +050,4,8,35,028,New Mexico,Los Alamos County,17950,17950,17995,18237,18248,17970,17830,17848,18241,18778,19018,19383,19462,45,242,11,-278,-140,18,393,537,240,365,79,37,187,168,162,182,151,166,186,166,163,176,43,110,121,139,111,125,127,128,146,107,110,-6,77,47,23,71,26,39,58,20,56,66,8,113,89,122,53,83,73,49,53,68,55,41,52,-131,-436,-271,-90,280,428,168,243,-43,49,165,-42,-314,-218,-7,353,477,221,311,12,2,0,6,13,7,-1,1,2,-1,-2,1,94,94,94,94,94,94,94,94,94,94,94,94,10.322366968,9.2092640811,8.9458280413,10.167597765,8.4646000336,9.1994790656,10.048893811,8.7839983067,8.4893622562,9.0616552967,6.0719805697,6.6328628203,7.6757413441,6.2011173184,7.0071192331,7.0381556707,6.9153677841,7.7256852577,5.5727715424,5.6635345604,4.2503863988,2.5764012608,1.2700866972,3.9664804469,1.4574808005,2.1613233949,3.1335260272,1.058313049,2.9165907138,3.3981207363,6.2375800397,4.8787172811,6.7369816114,2.9608938547,4.6527271708,4.0455540469,2.6472892299,2.8045295798,3.5415744382,2.8317672802,2.8703908147,-7.181033301,-24.07642609,-15.1396648,-5.045125848,15.517193605,23.123261028,8.8898296116,12.655920419,-2.213927146,9.1079708545,-2.30231602,-17.33944448,-12.17877095,-0.392398677,19.562747652,25.770550258,11.694359191,16.197494857,0.6178401339 +050,4,8,35,029,New Mexico,Luna County,25095,25095,25082,25106,24922,24599,24430,24370,24373,24154,23904,23775,23905,-13,24,-184,-323,-169,-60,3,-219,-250,-129,130,84,381,389,389,394,415,399,396,331,372,344,93,292,285,285,313,307,312,306,317,273,287,-9,89,104,104,81,108,87,90,14,99,57,2,-5,-21,0,6,46,41,44,25,58,52,-4,-58,-270,-432,-261,-213,-124,-351,-288,-285,21,-2,-63,-291,-432,-255,-167,-83,-307,-263,-227,73,-2,-2,3,5,5,-1,-1,-2,-1,-1,0,551,551,551,551,551,551,551,550,548,549,548,548,15.18291225,15.551291277,15.710506654,16.072120582,17.008196721,16.37158156,16.320811095,13.775021849,15.604354118,14.429530201,11.636247709,11.393619573,11.510268371,12.76795366,12.581967213,12.801838213,12.611535846,13.192392526,11.451582458,12.038590604,3.5466645413,4.1576717038,4.2002382827,3.3041669216,4.4262295082,3.5697433478,3.7092752488,0.5826293229,4.1527716605,2.3909395973,-0.199250817,-0.839529863,0,0.2447531053,1.8852459016,1.682292842,1.813423455,1.0404095052,2.4329369324,2.1812080537,-2.311309476,-10.79395538,-17.44714364,-10.64676008,-8.729508197,-5.087910059,-14.46617347,-11.9855175,-11.95494872,0.8808724832,-2.510560293,-11.63348525,-17.44714364,-10.40200698,-6.844262295,-3.405617217,-12.65275002,-10.94510799,-9.522011787,3.0620805369 +050,4,8,35,031,New Mexico,McKinley County,71492,71485,71673,72340,72379,72682,72814,73485,73040,72463,71974,71478,70824,188,667,39,303,132,671,-445,-577,-489,-496,-654,298,1293,1246,1196,1192,1118,989,925,844,887,856,147,491,540,525,572,625,580,717,647,704,677,151,802,706,671,620,493,409,208,197,183,179,2,61,36,118,109,121,25,29,35,50,44,39,-195,-716,-486,-608,66,-881,-819,-723,-731,-876,41,-134,-680,-368,-499,187,-856,-790,-688,-681,-832,-4,-1,13,0,11,-9,2,5,2,2,-1,780,780,779,773,775,774,772,769,773,775,770,774,17.956712241,17.21957725,16.489614714,16.385330181,15.283768173,13.499402832,12.714514477,11.686756164,12.36650587,12.0307515,6.8188288557,7.4627381339,7.238334218,7.8627591137,8.544145893,7.9167377581,9.8554668976,8.9589232676,9.8151297995,9.5149751936,11.137883386,9.7568391158,9.2512804958,8.5225710672,6.7396222804,5.5826650742,2.8590475798,2.727832896,2.55137607,2.5157763067,0.8471457438,0.4975158756,1.6269017861,1.498322978,1.6541466449,0.3412386965,0.3986172106,0.4846403622,0.6970972869,0.6184031145,-2.708088853,-9.89503797,-6.70062939,-8.357618079,0.9022618063,-12.02525166,-11.25749985,-10.0112852,-10.19156233,-12.31184383,-1.860943109,-9.397522095,-5.073727604,-6.859295101,2.5564084512,-11.68401297,-10.85888263,-9.526644835,-9.494465048,-11.69344071 +050,4,8,35,033,New Mexico,Mora County,4881,4881,4893,4782,4683,4694,4612,4609,4531,4530,4472,4490,4478,12,-111,-99,11,-82,-3,-78,-1,-58,18,-12,10,43,44,40,39,49,45,41,42,29,38,3,44,51,49,45,53,57,30,46,40,48,7,-1,-7,-9,-6,-4,-12,11,-4,-11,-10,0,-3,-2,0,0,0,0,0,0,0,0,5,-107,-92,19,-77,2,-66,-12,-54,29,-2,5,-110,-94,19,-77,2,-66,-12,-54,29,-2,0,0,2,1,1,-1,0,0,0,0,0,8,8,8,8,8,8,8,8,8,8,8,8,8.8888888889,9.2974115161,8.5315132772,8.3816892328,10.627914543,9.8468271335,9.0497737557,9.3312597201,6.4717696943,8.4745762712,9.0956072351,10.776545166,10.451103765,9.6711798839,11.495499404,12.472647702,6.6217856749,10.219951122,8.9265788886,10.704727921,-0.206718346,-1.47913365,-1.919590487,-1.289490651,-0.867584861,-2.625820569,2.4279880808,-0.888691402,-2.454809194,-2.23015165,-0.620155039,-0.422609614,0,0,0,0,0,0,0,0,-22.11886305,-19.44004226,4.0524688067,-16.54846336,0.4337924303,-14.44201313,-2.64871427,-11.99733393,6.4717696943,-0.44603033,-22.73901809,-19.86265188,4.0524688067,-16.54846336,0.4337924303,-14.44201313,-2.64871427,-11.99733393,6.4717696943,-0.44603033 +050,4,8,35,035,New Mexico,Otero County,63797,63836,64405,65659,66240,66347,65394,64838,65723,66158,66599,67572,67967,569,1254,581,107,-953,-556,885,435,441,973,395,207,907,938,813,887,926,954,948,912,895,862,95,570,530,564,599,616,640,620,626,620,647,112,337,408,249,288,310,314,328,286,275,215,71,385,604,808,352,547,329,209,186,344,264,358,528,-430,-955,-1633,-1426,241,-98,-28,353,-84,429,913,174,-147,-1281,-879,570,111,158,697,180,28,4,-1,5,40,13,1,-4,-3,1,0,2306,2303,2306,2328,2363,2292,2270,2320,2312,2301,2376,2374,13.946979948,14.223003965,12.263645757,13.465815502,14.220775232,14.613858656,14.376597084,13.739388507,13.341184011,12.719586245,8.7649157338,8.0364521338,8.5076214108,9.0936003218,9.460040543,9.8038464779,9.4024158143,9.4307644795,9.2419375275,9.5470676337,5.1820642145,6.1865518313,3.7560243463,4.3722151798,4.7607346889,4.8100121782,4.9741812695,4.3086240274,4.099246484,3.1725186109,5.9201623816,9.1585228091,12.188223581,5.3438185531,8.4003931445,5.03978983,3.1695240406,2.8021121297,5.1277846927,3.8955577361,8.1190798376,-6.52014041,-14.40563554,-24.79106732,-21.89937957,3.6917609393,-1.486188306,-0.421823331,5.2619418503,-1.239495643,14.039242219,2.6383823987,-2.217411963,-19.44724877,-13.49898642,8.7315507694,1.6833357345,2.3802887983,10.389726543,2.6560620928 +050,4,8,35,037,New Mexico,Quay County,9041,9040,9065,9044,8806,8675,8467,8449,8391,8291,8203,8243,8197,25,-21,-238,-131,-208,-18,-58,-100,-88,40,-46,31,122,117,94,88,82,82,94,96,93,100,45,130,114,131,116,112,112,128,141,83,107,-14,-8,3,-37,-28,-30,-30,-34,-45,10,-7,0,-3,-1,9,10,25,16,9,6,9,8,37,-10,-247,-104,-193,-13,-42,-77,-50,23,-48,37,-13,-248,-95,-183,12,-26,-68,-44,32,-40,2,0,7,1,3,0,-2,2,1,-2,1,22,22,22,22,22,22,22,22,22,22,22,22,13.473963223,13.109243697,10.754533494,10.267180026,9.6949633483,9.7387173397,11.269631939,11.640596581,11.30974097,12.165450122,14.357501795,12.773109244,14.987700932,13.534010034,13.241901159,13.301662708,15.345881789,17.097126228,10.093639791,13.01703163,-0.883538572,0.3361344538,-4.233167439,-3.266830008,-3.54693781,-3.562945368,-4.07624985,-5.456529647,1.2161011796,-0.851581509,-0.331326964,-0.112044818,1.029689377,1.1667250029,2.9557815086,1.9002375297,1.0790073133,0.7275372863,1.0944910617,0.9732360097,-1.104423215,-27.67507003,-11.8986328,-22.51779256,-1.537006384,-4.988123515,-9.231507014,-6.062810719,2.7970327131,-5.839416058,-1.435750179,-27.78711485,-10.86894342,-21.35106755,1.4187751241,-3.087885986,-8.1524997,-5.335273433,3.8915237748,-4.866180049 +050,4,8,35,039,New Mexico,Rio Arriba County,40246,40220,40286,40241,40191,40059,39726,39358,39225,39204,38979,38883,38521,66,-45,-50,-132,-333,-368,-133,-21,-225,-96,-362,158,589,576,595,546,517,509,470,425,392,397,77,351,405,367,425,388,426,406,459,419,474,81,238,171,228,121,129,83,64,-34,-27,-77,9,28,44,68,33,40,20,19,14,26,19,-20,-310,-267,-431,-495,-538,-235,-103,-203,-95,-303,-11,-282,-223,-363,-462,-498,-215,-84,-189,-69,-284,-4,-1,2,3,8,1,-1,-1,-2,0,-1,425,425,425,425,425,425,425,425,425,425,425,425,14.628633874,14.322657649,14.828660436,13.68678323,13.074705377,12.954455798,11.985362557,10.87192868,10.069096607,10.25786781,8.7175729879,10.070618659,9.1464174455,10.653631635,9.8123514238,10.842039627,10.353313188,11.741682975,10.762631322,12.247429073,5.9110608864,4.2520389895,5.6822429907,3.0331515949,3.2623539528,2.1124161714,1.6320493695,-0.869754294,-0.693534715,-1.989561263,0.6954189278,1.0940919037,1.6947040498,0.8272231622,1.011582621,0.5090159449,0.4845146566,0.3581341212,0.6678482443,0.4909307013,-7.699280987,-6.639148598,-10.74143302,-12.40834743,-13.60578625,-5.980937353,-2.626579454,-5.192944758,-2.440214739,-7.829052762,-7.003862059,-5.545056694,-9.046728972,-11.58112427,-12.59420363,-5.471921408,-2.142064797,-4.834810637,-1.772366495,-7.338122061 +050,4,8,35,041,New Mexico,Roosevelt County,19846,19840,20020,20429,20322,20033,19659,19157,19163,18889,18713,18501,18350,180,409,-107,-289,-374,-502,6,-274,-176,-212,-151,76,284,294,280,315,296,281,252,266,246,253,47,158,162,167,125,152,145,170,163,132,177,29,126,132,113,190,144,136,82,103,114,76,4,17,24,64,29,76,37,47,24,59,45,134,265,-267,-474,-606,-733,-167,-406,-306,-386,-270,138,282,-243,-410,-577,-657,-130,-359,-282,-327,-225,13,1,4,8,13,11,0,3,3,1,-2,1083,1083,1083,1083,1081,1079,1078,1078,1078,1078,1078,1078,14.042374348,14.429093765,13.876843018,15.872216064,15.251442704,14.665970772,13.245033113,14.148183607,13.22083087,13.730970666,7.8123068555,7.9507251356,8.2765456573,6.298498438,7.8318219291,7.5678496868,8.9351413855,8.669751609,7.0941043693,9.6062522048,6.2300674924,6.478368629,5.6002973609,9.5737176257,7.4196207749,7.0981210856,4.3098917271,5.4784319983,6.1267265008,4.1247184608,0.8405646617,1.1778852053,3.1718498327,1.4612516376,3.9159109646,1.9311064718,2.4703037948,1.2765278443,3.1708496802,2.4422675097,13.102919726,-13.10397291,-23.49151282,-30.53512043,-37.76793075,-8.716075157,-21.33922001,-16.27573001,-20.74488096,-14.65360506,13.943484388,-11.9260877,-20.31966299,-29.07386879,-33.85201979,-6.784968685,-18.86891622,-14.99920217,-17.57403128,-12.21133755 +050,4,8,35,043,New Mexico,Sandoval County,131561,131623,132437,134347,135415,136356,137076,138586,140583,142832,145407,147045,148904,814,1910,1068,941,720,1510,1997,2249,2575,1638,1859,371,1599,1472,1445,1440,1468,1471,1450,1386,1378,1365,159,948,888,991,975,1035,1059,1145,1210,1209,1252,212,651,584,454,465,433,412,305,176,169,113,15,105,38,25,-15,25,32,30,49,64,58,548,1151,468,478,297,1056,1554,1914,2350,1409,1694,563,1256,506,503,282,1081,1586,1944,2399,1473,1752,39,3,-22,-16,-27,-4,-1,0,0,-4,-6,761,761,761,761,761,761,761,761,761,761,760,760,11.987225621,10.913323596,10.63395285,10.532783288,10.650724438,10.53841938,10.232344795,9.6170192098,9.4237686868,9.2245623401,7.1068729759,6.5835810826,7.2929046881,7.1315720179,7.5091960444,7.5868022596,8.0800239931,8.3958104212,8.2680234705,8.4609172526,4.8803526448,4.3297425138,3.3410481619,3.4012112701,3.1415283935,2.9516171208,2.1523208017,1.2212087885,1.1557452163,0.7636450875,0.7871536524,0.2817298211,0.183978423,-0.109716493,0.181381547,0.2292518152,0.2117036854,0.3399956286,0.4376786618,0.3919594254,8.6287033705,3.4697251651,3.517667448,2.1723865531,7.6615565439,11.133041276,13.506695129,16.305912802,9.6357692886,11.447918391,9.4158570229,3.7514549862,3.701645871,2.0626700606,7.8429380909,11.362293091,13.718398814,16.64590843,10.07344795,11.839877817 +050,4,8,35,045,New Mexico,San Juan County,130044,130045,130209,129732,129792,129509,129143,128324,128011,127039,125652,124027,123312,164,-477,60,-283,-366,-819,-313,-972,-1387,-1625,-715,460,1921,1867,1936,1908,1857,1745,1624,1446,1434,1382,201,878,898,900,938,1023,1010,1108,1065,1180,1199,259,1043,969,1036,970,834,735,516,381,254,183,4,37,35,102,12,26,16,25,19,29,27,-91,-1566,-952,-1442,-1369,-1693,-1063,-1522,-1790,-1908,-924,-87,-1529,-917,-1340,-1357,-1667,-1047,-1497,-1771,-1879,-897,-8,9,8,21,21,14,-1,9,3,0,-1,1754,1754,1755,1750,1750,1745,1737,1741,1742,1741,1736,1739,14.780277063,14.387879348,14.932453018,14.753413853,14.425149631,13.614996001,12.734757891,11.444808086,11.486748986,11.174946127,6.7553791053,6.9203618933,6.9417395228,7.2529885715,7.9466494735,7.8803128718,8.6884924525,8.4292673661,9.4521365433,9.6951956626,8.0248979576,7.467517455,7.9907134951,7.5004252818,6.4785001573,5.7346831295,4.0462654381,3.0155407197,2.0346124424,1.4797504639,0.2846799851,0.2697245727,0.7867304792,0.0927887664,0.2019676308,0.1248366396,0.1960399922,0.1503812957,0.232298271,0.2183238389,-12.04888802,-7.336508377,-11.12220932,-10.58565176,-13.15119996,-8.29383424,-11.93491472,-14.16750102,-15.28362417,-7.471526933,-11.76420803,-7.066783804,-10.33547885,-10.492863,-12.94923233,-8.168997601,-11.73887473,-14.01711972,-15.0513259,-7.253203094 +050,4,8,35,047,New Mexico,San Miguel County,29393,29375,29392,29352,29094,28825,28501,28223,27999,27737,27512,27337,27144,17,-40,-258,-269,-324,-278,-224,-262,-225,-175,-193,92,321,337,351,303,312,259,272,237,254,244,35,280,270,276,270,284,310,295,286,294,301,57,41,67,75,33,28,-51,-23,-49,-40,-57,6,62,74,115,73,72,45,45,52,69,54,-47,-143,-409,-468,-439,-381,-219,-284,-226,-205,-189,-41,-81,-335,-353,-366,-309,-174,-239,-174,-136,-135,1,0,10,9,9,3,1,0,-2,1,-1,1310,1310,1307,1307,1305,1302,1301,1300,1300,1298,1296,1294,10.928775705,11.532012456,12.120375006,10.571119562,11.000634652,9.2134751521,9.7602985503,8.5793408025,9.2617914638,8.9572511518,9.5328884652,9.2392978134,9.5305512871,9.4198095105,10.013398209,11.027711572,10.585617913,10.353128563,10.720341301,11.049723757,1.3958872395,2.2927146426,2.5898237193,1.1513100513,0.9872364431,-1.81423642,-0.825319363,-1.773787761,-1.458549837,-2.092472605,2.1108538744,2.5322519933,3.9710630363,2.5468373862,2.5386079966,1.6007968411,1.6147552749,1.8823870115,2.5159984685,1.982342468,-4.868582323,-13.99582521,-16.16050001,-15.3159125,-13.43346732,-7.790544627,-10.19089996,-8.18114355,-7.475067914,-6.938198638,-2.757728449,-11.46357321,-12.18943697,-12.76907511,-10.89485932,-6.189747786,-8.576144682,-6.298756539,-4.959069445,-4.95585617 +050,4,8,35,049,New Mexico,Santa Fe County,144170,144237,144526,145876,146774,147545,147876,148199,148884,149687,150128,150951,151946,289,1350,898,771,331,323,685,803,441,823,995,340,1484,1384,1323,1312,1334,1252,1258,1198,1195,1163,213,1024,1054,1114,1081,1134,1214,1153,1213,1264,1336,127,460,330,209,231,200,38,105,-15,-69,-173,76,730,369,441,55,165,171,153,126,216,178,97,166,224,134,77,-19,483,552,339,681,993,173,896,593,575,132,146,654,705,465,897,1171,-11,-6,-25,-13,-32,-23,-7,-7,-9,-5,-3,2613,2616,2615,2625,2631,2630,2630,2634,2634,2634,2632,2634,10.220315287,9.458397403,8.9902452781,8.882239245,9.0112302626,8.4286209578,8.4268063543,7.9915948168,7.9381159098,7.6791780704,7.0522930283,7.203143687,7.570017566,7.3183693779,7.6602212277,8.1728001939,7.7234560624,8.0916565215,8.3964673724,8.8214805693,3.1680222588,2.255253716,1.4202277121,1.5638698671,1.3510090349,0.2558207639,0.7033502919,-0.100061705,-0.458351463,-1.142302499,5.0275135846,2.5217837007,2.996748426,0.3723499684,1.1145824538,1.1511934375,1.0248818539,0.8405183196,1.4348393611,1.175317022,1.1432428151,1.530838886,0.9105766192,0.5212899557,-0.128345858,3.2516165516,3.6976129631,2.2613945266,4.5237296524,6.5566842854,6.1707563997,4.0526225867,3.9073250453,0.893639924,0.9862365955,4.4028099891,4.722494817,3.1019128463,5.9585690134,7.7320013074 +050,4,8,35,051,New Mexico,Sierra County,11988,11996,12043,12027,11858,11531,11277,11252,11129,11094,10963,10886,10867,47,-16,-169,-327,-254,-25,-123,-35,-131,-77,-19,19,92,76,113,113,124,99,98,106,91,86,30,229,232,249,246,229,277,260,276,201,221,-11,-137,-156,-136,-133,-105,-178,-162,-170,-110,-135,-1,-4,-5,-2,1,4,7,8,6,9,7,55,123,-7,-188,-120,77,49,119,34,25,111,54,119,-12,-190,-119,81,56,127,40,34,118,4,2,-1,-1,-2,-1,-1,0,-1,-1,-2,265,265,265,265,265,265,265,265,265,265,265,265,7.6443705858,6.3638266695,9.6626619351,9.9088039284,11.008034089,8.8467896877,8.8196913108,9.6114612141,8.329900682,7.9069553625,19.02783548,19.426418254,21.29206037,21.571378464,20.329353278,24.753138823,23.399181029,25.026068822,18.399011396,20.319036455,-11.38346489,-13.06259158,-11.62939844,-11.66257454,-9.321319189,-15.90634914,-14.57948972,-15.41460761,-10.06911071,-12.41208109,-0.332363939,-0.418672807,-0.171020565,0.0876885303,0.3550978739,0.625530584,0.7199748009,0.5440449744,0.8238363312,0.64358939,10.220191109,-0.58614193,-16.07593313,-10.52262364,6.8356340716,4.3787140878,10.709625163,3.0829215215,2.2884342533,10.205488898,9.8878271708,-1.004814737,-16.2469537,-10.43493511,7.1907319455,5.0042446718,11.429599964,3.6269664959,3.1122705845,10.849078288 +050,4,8,35,053,New Mexico,Socorro County,17866,17861,17791,17777,17471,17507,17255,17148,16989,16825,16649,16613,16541,-70,-14,-306,36,-252,-107,-159,-164,-176,-36,-72,52,263,199,230,216,188,227,183,177,193,185,72,167,179,159,189,173,181,198,158,136,163,-20,96,20,71,27,15,46,-15,19,57,22,5,22,30,50,41,66,56,26,30,39,27,-59,-132,-367,-87,-328,-188,-262,-175,-225,-132,-122,-54,-110,-337,-37,-287,-122,-206,-149,-195,-93,-95,4,0,11,2,8,0,1,0,0,0,1,583,583,583,583,583,582,580,580,581,581,581,581,14.788573999,11.29142079,13.151123563,12.427363213,10.929279423,13.299352609,10.823919087,10.57537193,11.604834345,11.160041021,9.3904633378,10.15660463,9.0914288982,10.873942811,10.057262448,10.604329613,11.711125569,9.4401625142,8.1774998497,9.8329010074,5.3981106613,1.1348161598,4.0596946652,1.5534204016,0.8720169753,2.6950229956,-0.887206483,1.1352094163,3.4273344958,1.3271400133,1.2370670265,1.7022242397,2.8589399051,2.3588976469,3.8368746912,3.2808975598,1.5378245697,1.7924359204,2.3450183392,1.6287627436,-7.422402159,-20.82387653,-4.974555435,-18.87118117,-10.92927942,-15.34991358,-10.3507423,-13.4432694,-7.936985148,-7.359594619,-6.185335133,-19.12165229,-2.11561553,-16.51228353,-7.092404732,-12.06901602,-8.812917726,-11.65083348,-5.591966809,-5.730831875 +050,4,8,35,055,New Mexico,Taos County,32937,32933,32897,32896,32767,32961,32967,32806,32925,32811,32708,32752,32593,-36,-1,-129,194,6,-161,119,-114,-103,44,-159,78,339,325,296,309,304,270,292,282,241,244,79,255,284,278,265,290,310,332,350,299,323,-1,84,41,18,44,14,-40,-40,-68,-58,-79,5,36,40,98,23,29,-4,1,-7,0,0,-38,-120,-212,80,-52,-202,164,-72,-24,102,-78,-33,-84,-172,178,-29,-173,160,-71,-31,102,-78,-2,-1,2,-2,-9,-2,-1,-3,-4,0,-2,470,470,470,470,470,470,470,470,470,470,470,470,10.305047649,9.8990298951,9.0068159688,9.3738623953,9.2439146762,8.2153017602,8.8840209322,8.6081899907,7.3632752826,7.468054174,7.7515845151,8.6502292006,8.459104187,8.039072928,8.8182080793,9.4323835025,10.101010101,10.683923747,9.135349832,9.8859897467,2.5534631344,1.2488006945,0.5477117819,1.3347894673,0.4257065969,-1.217081742,-1.216989169,-2.075733757,-1.772074549,-2.417935573,1.0943413433,1.2183421409,2.9819863681,0.6977308579,0.8818208079,-0.121708174,0.0304247292,-0.213678475,0,0,-3.647804478,-6.457213347,2.4342745862,-1.577478461,-6.142338041,4.9900351432,-2.190580504,-0.732611914,3.1164069661,-2.387328793,-2.553463134,-5.238871206,5.4162609542,-0.879747603,-5.260517234,4.868326969,-2.160155775,-0.946290389,3.1164069661,-2.387328793 +050,4,8,35,057,New Mexico,Torrance County,16383,16375,16399,16447,16153,15821,15662,15592,15466,15510,15481,15442,15486,24,48,-294,-332,-159,-70,-126,44,-29,-39,44,41,172,172,141,133,159,159,166,153,154,155,12,140,165,146,164,156,170,163,146,148,167,29,32,7,-5,-31,3,-11,3,7,6,-12,11,57,49,85,35,46,15,27,18,31,26,-16,-41,-365,-422,-167,-119,-130,14,-53,-75,29,-5,16,-316,-337,-132,-73,-115,41,-35,-44,55,0,0,15,10,4,0,0,0,-1,-1,1,615,615,615,614,615,615,615,612,611,611,611,611,10.47311697,10.552147239,8.8196659786,8.4490042245,10.174697639,10.23890785,10.717975207,9.873834339,9.9602237817,10.023279876,8.5246300919,10.122699387,9.1324200913,10.418320999,9.9827222116,10.947259965,10.52427686,9.4220902843,9.5721631148,10.799275737,1.9484868782,0.4294478528,-0.312754113,-1.969316774,0.1919754271,-0.708352115,0.1936983471,0.4517440547,0.3880606668,-0.775995861,3.4707422517,3.0061349693,5.3168199162,2.2234221643,2.9436232162,0.9659347028,1.743285124,1.1616275693,2.0049801119,1.6813243663,-2.496498813,-22.39263804,-26.39644711,-10.60890004,-7.615025277,-8.371434091,0.9039256198,-3.420347843,-4.850758335,1.8753233316,0.9742434391,-19.38650307,-21.0796272,-8.385477877,-4.671402061,-7.405499388,2.6472107438,-2.258720274,-2.845778223,3.5566476979 +050,4,8,35,059,New Mexico,Union County,4549,4553,4541,4416,4408,4354,4259,4174,4166,4194,4099,4043,4026,-12,-125,-8,-54,-95,-85,-8,28,-95,-56,-17,15,48,37,45,39,38,39,35,42,42,38,15,53,55,41,46,54,44,38,43,37,43,0,-5,-18,4,-7,-16,-5,-3,-1,5,-5,0,2,1,1,0,1,-3,1,-1,0,5,-12,-124,12,-60,-92,-70,1,30,-93,-61,-17,-12,-122,13,-59,-92,-69,-2,31,-94,-61,-12,0,2,-3,1,4,0,-1,0,0,0,0,662,662,662,663,663,663,663,672,672,672,667,667,10.717874288,8.3862194016,10.271627482,9.0560780216,9.0122139215,9.3525179856,8.3732057416,10.129024478,10.316875461,9.4187631677,11.834319527,12.466001813,9.3585939283,10.681527923,12.806830309,10.551558753,9.0909090909,10.370191728,9.088676001,10.658074111,-1.116445238,-4.079782412,0.913033554,-1.625449901,-3.794616388,-1.199040767,-0.717703349,-0.241167249,1.2281994596,-1.239310943,0.4465780953,0.2266545784,0.2282583885,0,0.2371635242,-0.71942446,0.2392344498,-0.241167249,0,1.2393109431,-27.68784191,2.7198549411,-13.69550331,-21.36305585,-16.6014467,0.2398081535,7.1770334928,-22.4285542,-14.98403341,-4.213657207,-27.24126382,2.9465095195,-13.46724492,-21.36305585,-16.36428317,-0.479616307,7.4162679426,-22.66972145,-14.98403341,-2.974346263 +050,4,8,35,061,New Mexico,Valencia County,76569,76589,76805,76973,76798,76499,75892,75665,75639,75970,76452,76953,77574,216,168,-175,-299,-607,-227,-26,331,482,501,621,218,968,907,868,805,819,836,827,826,790,783,90,578,589,596,646,673,673,651,728,693,767,128,390,318,272,159,146,163,176,98,97,16,5,52,56,92,-1,-6,8,61,55,99,70,85,-273,-551,-675,-775,-364,-195,101,334,306,536,90,-221,-495,-583,-776,-370,-187,162,389,405,606,-2,-1,2,12,10,-3,-2,-7,-5,-1,-1,1529,1529,1529,1533,1545,1544,1546,1554,1553,1552,1551,1549,12.589577183,11.796762719,11.324422526,10.564928375,10.807814882,11.050600116,10.909642567,10.838330425,10.299533913,10.134151313,7.5173301773,7.6607422726,7.7757555595,8.4781909693,8.8811470272,8.8959974621,8.5878806667,9.552426815,9.0349075975,9.9270677616,5.0722470054,4.136020446,3.5486669667,2.0867374058,1.9266678543,2.1546026543,2.3217619007,1.2859036097,1.264626316,0.2070835517,0.6762996007,0.7283558018,1.2002844152,-0.013124135,-0.079178131,0.1057473695,0.8047015678,0.7216805973,1.2907010854,0.9059905389,-3.550572904,-7.166500836,-8.806434568,-10.17120434,-4.803473281,-2.577592132,1.3323747271,4.3825694454,3.9894397184,6.9372989833,-2.874273303,-6.438145034,-7.606150153,-10.18432847,-4.882651412,-2.471844763,2.1370762949,5.1042500426,5.2801408038,7.8432895222 +040,1,2,36,000,New York,New York,19378102,19378117,19399956,19499921,19574362,19626488,19653431,19657321,19636391,19593849,19544098,19463131,19336776,21839,99965,74441,52126,26943,3890,-20930,-42542,-49751,-80967,-126355,61404,243117,239907,239882,237033,239348,235792,231207,229316,223378,220375,35115,149781,146887,152565,148863,153901,151604,155117,156755,162158,177602,26289,93336,93020,87317,88170,85447,84188,76090,72561,61220,42773,19025,87332,90304,78010,84452,84301,88805,69336,57774,41869,35181,-22653,-80685,-108325,-112510,-145557,-166054,-194135,-188058,-180043,-183857,-203893,-3628,6647,-18021,-34500,-61105,-81753,-105330,-118722,-122269,-141988,-168712,-822,-18,-558,-691,-122,196,212,90,-43,-199,-416,585684,585694,584193,582385,579264,578067,575123,573288,572936,571064,564400,564192,12.499628212,12.279534342,12.238612173,12.068914908,12.177228256,12.001513117,11.787182541,11.718345881,11.453159105,11.35956331,7.7008469718,7.5183465299,7.7837597909,7.5795981148,7.8299697752,7.7164509171,7.9080321711,8.0103843975,8.3142537502,9.1547642112,4.7987812404,4.7611878125,4.454852382,4.4893167931,4.3472584803,4.2850622003,3.8791503697,3.707961483,3.1389053552,2.2047990991,4.4900913183,4.6221705463,3.9800157395,4.3000088671,4.2889538211,4.5200616323,3.5348241561,2.952326549,2.1467302894,1.8134579549,-4.148342166,-5.54456751,-5.740181654,-7.411267829,-8.448273897,-9.881224762,-9.587399924,-9.200431489,-9.426816757,-10.50997365,0.3417491526,-0.922396964,-1.760165915,-3.111258962,-4.159320076,-5.36116313,-6.052575768,-6.24810494,-7.280086468,-8.69651569 +050,1,2,36,001,New York,Albany County,304204,304199,304085,304627,305776,306661,307246,307521,307810,307919,306691,304752,303654,-114,542,1149,885,585,275,289,109,-1228,-1939,-1098,791,3091,3124,3195,3170,3172,3212,3108,2964,2863,2831,563,2689,2803,2656,2600,2668,2724,2741,2846,2804,2964,228,402,321,539,570,504,488,367,118,59,-133,243,1072,1021,903,1100,1103,1218,915,700,540,470,-594,-929,-116,-508,-1053,-1313,-1414,-1171,-2050,-2543,-1447,-351,143,905,395,47,-210,-196,-256,-1350,-2003,-977,9,-3,-77,-49,-32,-19,-3,-2,4,5,12,17024,17067,17221,17571,17705,17649,17608,17509,17538,17239,16700,16698,10.155870099,10.235860571,10.433726244,10.327297131,10.319356764,10.439909577,10.09535039,9.645140821,9.3647322809,9.3062856053,8.8350484301,9.1840964084,8.6735451973,8.4703383411,8.6797111751,8.8537713848,8.9032675089,9.261157482,9.1717461808,9.7434936539,1.3208216694,1.0517641624,1.7601810472,1.8569587902,1.6396455893,1.5861381923,1.1920828806,0.383983339,0.1929861001,-0.437208049,3.5221911183,3.3453308716,2.9488747414,3.5836046828,3.5883513591,3.9588449144,2.972086746,2.2778672654,1.7663134585,1.5450209235,-3.052346594,-0.380076769,-1.658946145,-3.430487028,-4.271537021,-4.595900418,-3.803621398,-6.670896992,-8.318028009,-4.756692077,0.4698445242,2.9652541026,1.2899285967,0.1531176546,-0.683185662,-0.637055503,-0.831534652,-4.393029726,-6.551714551,-3.211671154 +050,1,2,36,003,New York,Allegany County,48946,48923,48973,48808,48221,47918,47671,47352,47063,46669,46286,45915,45587,50,-165,-587,-303,-247,-319,-289,-394,-383,-371,-328,121,538,466,498,492,502,490,494,460,471,446,73,473,472,489,443,510,475,496,510,474,494,48,65,-6,9,49,-8,15,-2,-50,-3,-48,13,60,57,43,52,50,58,43,39,25,26,-6,-291,-660,-360,-348,-362,-363,-438,-374,-393,-307,7,-231,-603,-317,-296,-312,-305,-395,-335,-368,-281,-5,1,22,5,0,1,1,3,2,0,1,4584,4580,4571,4395,4301,4357,4364,4370,4263,4221,4099,4096,11.004182817,9.6053757124,10.359999584,10.294071494,10.565863002,10.379706614,10.540690479,9.8972621161,10.216808928,9.7484207995,9.6746811753,9.7290500778,10.172770676,9.2688489261,10.734243288,10.061960494,10.583365339,10.973051477,10.281884144,10.797578195,1.3295016414,-0.123674365,0.1872289081,1.0252225675,-0.168380287,0.3177461208,-0.04267486,-1.07578936,-0.065075216,-1.049157395,1.2272322844,1.1749064713,0.8945381167,1.0879912961,1.052376793,1.228618334,0.9175094952,0.8391157011,0.5422934675,0.5682935892,-5.952076579,-13.60418019,-7.489156326,-7.28117252,-7.619207981,-7.689456125,-9.345794393,-8.046904416,-8.52485331,-6.710235842,-4.724844295,-12.42927372,-6.594618209,-6.193181224,-6.566831188,-6.460837791,-8.428284897,-7.207788715,-7.982559842,-6.141942253 +050,1,2,36,005,New York,Bronx County,1385108,1384224,1386929,1396954,1411087,1421498,1430474,1439480,1443678,1439956,1432316,1418187,1401142,2705,10025,14133,10411,8976,9006,4198,-3722,-7640,-14129,-17045,5428,22097,21739,21403,21291,21482,21120,20755,20520,19565,19182,2169,8901,8949,9274,9224,9437,9479,9609,9732,10675,12017,3259,13196,12790,12129,12067,12045,11641,11146,10788,8890,7165,2720,13327,13679,12258,13185,13267,14235,12100,11458,8199,6795,-3401,-16589,-12441,-14083,-16451,-16399,-21746,-27069,-29971,-31170,-30848,-681,-3262,1238,-1825,-3266,-3132,-7511,-14969,-18513,-22971,-24053,127,91,105,107,175,93,68,101,85,-48,-157,46705,46717,46241,45316,45053,44348,44136,44018,44385,44227,44187,44149,15.874948768,15.483392158,15.111991344,14.93072162,14.970274785,14.650601875,14.395030715,14.28834038,13.727401795,13.60749313,6.394665293,6.3738385586,6.5480824053,6.4685067034,6.5764120261,6.5754287486,6.6645073543,6.7765169872,7.4899061674,8.524723436,9.4802834746,9.1095535998,8.5639089383,8.4622149166,8.3938627588,8.0751731261,7.7305233605,7.5118233928,6.237495628,5.0827696945,9.5743966251,9.7427352378,8.6549918184,9.246233834,9.2454443521,9.8745889056,8.3921884677,7.9783530251,5.7526689149,4.8202958931,-11.91788592,-8.860981731,-9.943567448,-11.5365789,-11.42805773,-15.08484793,-18.77422724,-20.86919345,-21.86982438,-21.88322115,-2.343489292,0.8817535072,-1.28857563,-2.290345067,-2.18261338,-5.210259028,-10.38203877,-12.89084042,-16.11715546,-17.06292526 +050,1,2,36,007,New York,Broome County,200600,200670,200474,199367,198689,197953,197295,195981,194575,193255,192222,190737,189420,-196,-1107,-678,-736,-658,-1314,-1406,-1320,-1033,-1485,-1317,494,2053,2097,2032,2151,2044,1959,2019,1943,1834,1823,431,2166,2039,2133,2112,2170,1991,2190,2067,2142,2249,63,-113,58,-101,39,-126,-32,-171,-124,-308,-426,95,416,465,398,464,501,565,445,338,261,225,-355,-1414,-1209,-1032,-1171,-1697,-1943,-1598,-1250,-1442,-1121,-260,-998,-744,-634,-707,-1196,-1378,-1153,-912,-1181,-896,1,4,8,-1,10,8,4,4,3,4,5,10141,10131,10324,10654,10792,10899,10967,11028,11017,11136,11057,11052,10.26908196,10.536205961,10.246015298,10.88430555,10.394735504,10.031852026,10.411778356,10.081016507,9.5780488251,9.590774338,10.834306637,10.244789678,10.755290665,10.686961098,11.03550687,10.195720972,11.293608024,10.724375255,11.186576109,11.83195364,-0.565224677,0.2914162831,-0.509275367,0.1973444521,-0.640771367,-0.163868946,-0.881829668,-0.643358748,-1.608527284,-2.241179302,2.0808271288,2.3363546838,2.0068474846,2.3478929685,2.5478290056,2.8933110745,2.2948198953,1.7536714253,1.3630701981,1.1837214624,-7.072811443,-6.074522178,-5.203684935,-5.925393677,-8.630071502,-9.949917553,-8.240724029,-6.485471247,-7.530832282,-5.897563375,-4.991984314,-3.738167494,-3.19683745,-3.577500708,-6.082242496,-7.056606479,-5.945904133,-4.731799822,-6.167762084,-4.713841913 +050,1,2,36,009,New York,Cattaraugus County,80317,80337,80220,79820,79354,79003,78690,77941,77711,77199,76748,76230,75863,-117,-400,-466,-351,-313,-749,-230,-512,-451,-518,-367,260,934,927,908,934,898,904,821,838,849,834,262,832,803,806,782,841,837,849,899,850,914,-2,102,124,102,152,57,67,-28,-61,-1,-80,5,43,34,49,48,23,25,17,13,8,8,-119,-546,-635,-502,-518,-832,-319,-502,-402,-527,-291,-114,-503,-601,-453,-470,-809,-294,-485,-389,-519,-283,-1,1,11,0,5,3,-3,1,-1,2,-4,2679,2663,2677,2599,2590,2598,2598,2607,2599,2555,2572,2571,11.67208198,11.647630894,11.467759556,11.845801653,11.466440232,11.615655436,10.599703053,10.886863661,11.099635242,10.966974154,10.39740065,10.089587495,10.17953106,9.918005238,10.738614961,10.75476062,10.961203279,11.67934419,11.112709017,12.018962082,1.2746813297,1.558043399,1.2882284964,1.9277964146,0.7278252709,0.8608948166,-0.361500226,-0.792480529,-0.013073775,-1.051987928,0.5373656586,0.4272054481,0.6188548659,0.6087778151,0.2936838812,0.3212294092,0.21948228,0.1688892931,0.1045902025,0.1051987928,-6.823294176,-7.978689987,-6.340104953,-6.569727255,-10.62369518,-4.098887261,-6.481182622,-5.222576601,-6.889879591,-3.82660609,-6.285928518,-7.551484539,-5.721250087,-5.96094944,-10.3300113,-3.777657852,-6.261700342,-5.053687308,-6.785289388,-3.721407297 +050,1,2,36,011,New York,Cayuga County,80026,80022,79905,79707,79524,79112,78782,78323,77696,77495,77121,76450,76029,-117,-198,-183,-412,-330,-459,-627,-201,-374,-671,-421,212,819,792,798,734,781,743,784,744,707,691,202,741,737,777,717,793,815,744,769,790,759,10,78,55,21,17,-12,-72,40,-25,-83,-68,8,47,65,54,58,58,66,52,48,32,23,-135,-324,-296,-494,-398,-507,-623,-290,-398,-620,-377,-127,-277,-231,-440,-340,-449,-557,-238,-350,-588,-354,0,1,-7,7,-7,2,2,-3,1,0,1,4245,4174,4165,4259,3987,4157,4054,3895,3848,3855,3763,3762,10.262386287,9.9478116698,10.060768048,9.2973767211,9.9423952134,9.5244809927,10.103678693,9.6238422932,9.2074675557,9.0635431764,9.2850161642,9.256991415,9.7960109937,9.0820423829,10.095159288,10.447445503,9.5881848819,9.9472240907,10.288400805,9.9554692777,0.9773701225,0.6908202548,0.2647570539,0.2153343382,-0.152764075,-0.922964511,0.5154938109,-0.323381797,-1.080933249,-0.891926101,0.5889281508,0.8164239375,0.6808038528,0.7346700951,0.7383596957,0.8460508015,0.6701419541,0.6208930512,0.4167453491,0.3016808872,-4.059845124,-3.717869008,-6.228094506,-5.04135686,-6.454282168,-7.986206808,-3.737330129,-5.148238216,-8.074441138,-4.944943238,-3.470916974,-2.90144507,-5.547290653,-4.306686765,-5.715922472,-7.140156007,-3.067188175,-4.527345165,-7.657695789,-4.643262351 +050,1,2,36,013,New York,Chautauqua County,134905,134907,134726,134227,133333,132884,131792,130582,129310,128424,127516,126636,126032,-181,-499,-894,-449,-1092,-1210,-1272,-886,-908,-880,-604,311,1386,1411,1393,1431,1424,1451,1318,1343,1255,1263,393,1500,1411,1407,1354,1479,1414,1553,1584,1482,1505,-82,-114,0,-14,77,-55,37,-235,-241,-227,-242,24,187,197,182,223,189,173,168,208,32,67,-111,-570,-1109,-616,-1418,-1354,-1484,-820,-877,-688,-430,-87,-383,-912,-434,-1195,-1165,-1311,-652,-669,-656,-363,-12,-2,18,-1,26,10,2,1,2,3,1,6514,6550,6623,6421,6293,6165,6033,5996,6004,5933,5726,5731,10.306633501,10.547166991,10.465146854,10.813220692,10.854734082,11.16617672,10.227598997,10.494647183,9.8759797287,9.9973087213,11.154365261,10.547166991,10.570324209,10.231377231,11.27398294,10.881443061,12.051184555,12.377901071,11.662312317,11.912865895,-0.84773176,0,-0.105177355,0.5818434614,-0.419248858,0.2847336586,-1.823585557,-1.883253888,-1.786332588,-1.915557174,1.3905775359,1.4725669009,1.3673056191,1.6850791156,1.4406915319,1.3313222415,1.3036696749,1.6253809487,0.2518178098,0.5303402093,-4.238658799,-8.289729406,-4.627803634,-10.71498738,-10.32114463,-11.42012836,-6.363149604,-6.853168711,-5.414082911,-3.40367597,-2.848081263,-6.817162506,-3.260498015,-9.029908265,-8.880453094,-10.08880612,-5.059479929,-5.227787763,-5.162265101,-2.873335761 +050,1,2,36,015,New York,Chemung County,88830,88846,88895,88916,89162,88230,87239,86771,85692,84825,84033,83404,82622,49,21,246,-932,-991,-468,-1079,-867,-792,-629,-782,253,1024,1048,1023,918,1026,933,937,878,861,846,197,972,914,924,874,1000,937,1062,995,981,1014,56,52,134,99,44,26,-4,-125,-117,-120,-168,16,63,67,48,43,47,55,42,38,21,24,-13,-91,67,-1101,-1101,-538,-1134,-786,-715,-532,-637,3,-28,134,-1053,-1058,-491,-1079,-744,-677,-511,-613,-10,-3,-22,22,23,-3,4,2,2,2,-1,4916,4912,4895,4951,4716,4528,4439,4171,3961,3861,3611,3606,11.517847602,11.770123204,11.533778299,10.463386695,11.792425723,10.819712054,10.990106558,10.399270393,10.284465202,10.191174876,10.932956904,10.265164703,10.417606205,9.9618736073,11.493592322,10.866098815,12.456236035,11.78505016,11.717840143,12.214954284,0.5848906986,1.5049585013,1.1161720934,0.5015130878,0.2988334004,-0.046386761,-1.466129477,-1.385779768,-1.433374941,-2.023779408,0.7086175771,0.7524792507,0.5411743483,0.4901150631,0.5401988391,0.6378179668,0.4926195042,0.4500823177,0.2508406147,0.289111344,-1.023558722,0.7524792507,-12.41318661,-12.54922522,-6.183552669,-13.15064681,-9.21902215,-8.468654135,-6.354628905,-7.673496922,-0.314941145,1.5049585013,-11.87201227,-12.05911016,-5.64335383,-12.51282884,-8.726402646,-8.018571818,-6.103788291,-7.384385578 +050,1,2,36,017,New York,Chenango County,50477,50516,50404,50196,49898,49489,49339,48794,48325,47842,47502,47234,46730,-112,-208,-298,-409,-150,-545,-469,-483,-340,-268,-504,108,533,505,534,542,528,495,536,452,445,445,168,528,545,545,533,597,570,590,586,565,571,-60,5,-40,-11,9,-69,-75,-54,-134,-120,-126,1,3,11,7,14,11,10,11,10,6,4,-49,-217,-268,-407,-171,-490,-405,-440,-214,-154,-381,-48,-214,-257,-400,-157,-479,-395,-429,-204,-148,-377,-4,1,-1,2,-2,3,1,0,-2,0,-1,796,807,804,783,796,792,785,783,752,710,727,728,10.596421471,10.090514916,10.745872197,10.968551423,10.760906117,10.193679918,11.147275053,9.4814566202,9.3945279514,9.4717125708,10.497017893,10.889763622,10.967229114,10.786416805,12.167160894,11.738176876,12.27032142,12.292330928,11.927883803,12.153590737,0.0994035785,-0.799248706,-0.221356918,0.1821346177,-1.406254777,-1.544496957,-1.123046367,-2.810874308,-2.533355852,-2.681878166,0.0596421471,0.2197933942,0.1408634932,0.2833205165,0.2241855441,0.2059329276,0.2287687044,0.2097667394,0.1266677926,0.0851389894,-4.314115308,-5.354966332,-8.190205963,-3.460557737,-9.986446965,-8.34028357,-9.150748178,-4.489008223,-3.25114001,-8.10948874,-4.254473161,-5.135172937,-8.049342469,-3.17723722,-9.762261421,-8.134350642,-8.921979473,-4.279241483,-3.124472218,-8.024349751 +050,1,2,36,019,New York,Clinton County,82128,82131,82099,81735,81730,81544,81497,80759,80521,80595,80675,80031,79778,-32,-364,-5,-186,-47,-738,-238,74,80,-644,-253,220,796,786,740,765,776,732,765,747,738,707,159,704,692,735,663,700,700,695,731,768,806,61,92,94,5,102,76,32,70,16,-30,-99,24,112,104,96,109,99,104,74,54,49,46,-118,-572,-189,-290,-250,-922,-373,-68,13,-666,-204,-94,-460,-85,-194,-141,-823,-269,6,67,-617,-158,1,4,-14,3,-8,9,-1,-2,-3,3,4,7153,7073,6827,6919,6836,6937,6560,6514,6631,6659,6099,6102,9.7171527278,9.6167375279,9.0645173145,9.384142639,9.5651316438,9.0773809524,9.4962635617,9.2639672599,9.1844735106,8.8480623745,8.594064724,8.4666442358,9.0032705758,8.1329236204,8.6283404004,8.6805555556,8.6273244122,9.0655422583,9.5578260924,10.087041406,1.1230880037,1.1500932921,0.0612467386,1.2512190185,0.9367912435,0.3968253968,0.8689391494,0.1984250016,-0.373352582,-1.238979031,1.3672375697,1.2724436424,1.1759373813,1.3370869904,1.2202938566,1.2896825397,0.9185928151,0.6696843802,0.6098092168,0.5756872266,-6.982677588,-2.312421619,-3.552310839,-3.066713281,-11.36475693,-4.625496032,-0.844112317,0.1612203138,-8.288427314,-2.553047701,-5.615440019,-1.039977977,-2.376373458,-1.72962629,-10.14446307,-3.335813492,0.0744804985,0.830904694,-7.678618098,-1.977360474 +050,1,2,36,021,New York,Columbia County,63096,63063,63035,62532,62450,62153,61956,61451,60801,60312,59852,59582,59534,-28,-503,-82,-297,-197,-505,-650,-489,-460,-270,-48,155,573,535,562,511,507,524,486,471,476,449,138,700,645,669,670,708,684,643,708,679,710,17,-127,-110,-107,-159,-201,-160,-157,-237,-203,-261,11,47,41,67,91,70,78,53,51,47,36,-49,-423,-1,-258,-113,-372,-571,-381,-273,-113,176,-38,-376,40,-191,-22,-302,-493,-328,-222,-66,212,-7,0,-12,1,-16,-2,3,-4,-1,-1,1,2136,2133,2132,2199,2156,2122,2141,1929,1911,1880,1865,1863,9.1266017345,8.5612328175,9.0206495831,8.2346969196,8.2167138007,8.5724568923,8.0255629041,7.8392863087,7.970929551,7.5388696733,11.149426203,10.321486294,10.738104219,10.796960736,11.474227556,11.190000982,10.618183019,11.783895343,11.370296565,11.92115249,-2.022824468,-1.760253477,-1.717454636,-2.562263816,-3.257513755,-2.617544089,-2.592620115,-3.944609034,-3.399367014,-4.382282817,0.7486043308,0.6560944776,1.0754155197,1.4664528761,1.1344575267,1.2760527435,0.8752157076,0.8488399188,0.7870455649,0.6044528023,-6.737438977,-0.016002304,-4.1411523,-1.820979945,-6.028831428,-9.341360469,-6.291644993,-4.543790153,-1.892258486,2.9551025891,-5.988834646,0.6400921733,-3.06573678,-0.354527069,-4.894373901,-8.065307725,-5.416429285,-3.694950235,-1.105212921,3.5595553914 +050,1,2,36,023,New York,Cortland County,49336,49287,49277,49382,49028,48913,48747,48299,47950,47834,47721,47410,47173,-10,105,-354,-115,-166,-448,-349,-116,-113,-311,-237,121,477,454,465,487,465,505,505,444,460,444,83,430,448,503,401,428,468,453,457,430,458,38,47,6,-38,86,37,37,52,-13,30,-14,7,19,11,18,29,34,38,27,23,22,17,-54,39,-375,-91,-280,-523,-425,-194,-123,-363,-243,-47,58,-364,-73,-251,-489,-387,-167,-100,-341,-226,-1,0,4,-4,-1,4,1,-1,0,0,3,3561,3561,3741,3661,3848,3802,3790,3786,3804,3800,3688,3689,9.6696702784,9.2267046032,9.4955126045,9.9733770223,9.5830843105,10.493615518,10.54455859,9.2930772853,9.6708748988,9.388579343,8.7168935424,9.1047657758,10.271489979,8.2121646529,8.8205593224,9.7247763613,9.4587822601,9.5651718905,9.0401656663,9.6846156286,0.952776736,0.1219388274,-0.775977374,1.7612123694,0.7625249881,0.7688391568,1.0857763301,-0.272094605,0.6307092325,-0.296036286,0.3851650635,0.2235545168,0.3675682299,0.5938971943,0.7006986378,0.7896185934,0.5637684791,0.4813981477,0.4625201039,0.3594726325,0.7906019725,-7.62117671,-1.858261606,-5.734179807,-10.77839375,-8.831260585,-4.050780924,-2.574433572,-7.631581714,-5.1383441,1.175767036,-7.397622193,-1.490693377,-5.140282613,-10.07769511,-8.041641991,-3.487012445,-2.093035425,-7.16906161,-4.778871467 +050,1,2,36,025,New York,Delaware County,47980,47962,47888,47584,47217,46806,46567,45895,45399,45061,44624,44356,43938,-74,-304,-367,-411,-239,-672,-496,-338,-437,-268,-418,120,467,401,408,388,390,338,364,374,378,368,101,552,519,575,533,519,536,518,532,573,622,19,-85,-118,-167,-145,-129,-198,-154,-158,-195,-254,1,21,21,18,37,33,57,43,47,36,26,-95,-240,-268,-257,-121,-581,-353,-226,-325,-109,-190,-94,-219,-247,-239,-84,-548,-296,-183,-278,-73,-164,1,0,-2,-5,-10,5,-2,-1,-1,0,0,2435,2438,2384,2396,2317,2408,2330,2336,2337,2256,2350,2349,9.7829730183,8.4598263731,8.6787275454,8.310753644,8.4358979905,7.4046487173,8.0477559142,8.3403021687,8.4962913014,8.3357872562,11.563599799,10.94925159,12.23104985,11.416576526,11.22623348,11.742283173,11.452575724,11.863745331,12.879298719,14.089292591,-1.780626781,-2.489425217,-3.552322304,-3.105822882,-2.790335489,-4.337634456,-3.40481981,-3.523443162,-4.383007417,-5.753505334,0.4399195576,0.4430333013,0.3828850388,0.7925203217,0.713806753,1.2487129494,0.9506964404,1.0481128394,0.8091706001,0.5889414909,-5.027652086,-5.653948798,-5.466747498,-2.591755647,-12.56732496,-7.733257388,-4.996683617,-7.247588783,-2.449988762,-4.303803203,-4.587732529,-5.210915497,-5.083862459,-1.799235325,-11.8535182,-6.484544439,-4.045987177,-6.199475944,-1.640818161,-3.714861712 +050,1,2,36,027,New York,Dutchess County,297488,297444,297721,298141,297028,296292,295162,294105,293065,293512,293814,293934,293293,277,420,-1113,-736,-1130,-1057,-1040,447,302,120,-641,766,2754,2664,2746,2570,2684,2596,2502,2582,2580,2549,555,2286,2374,2406,2329,2300,2408,2510,2613,2781,3006,211,468,290,340,241,384,188,-8,-31,-201,-457,182,677,578,453,475,474,454,310,266,178,190,-87,-723,-2016,-1538,-1866,-1918,-1683,162,77,144,-383,95,-46,-1438,-1085,-1391,-1444,-1229,472,343,322,-193,-29,-2,35,9,20,3,1,-17,-10,-1,9,19965,19958,19919,19785,19651,19636,19771,19706,19677,19697,19509,19505,9.2437510699,8.9520791573,9.256387784,8.6904476088,9.1096226329,8.842413611,8.5308493173,8.7923912784,8.7792727495,8.6814809265,7.6729175547,7.9775660359,8.1102946134,7.8755068019,7.8063085155,8.2020539196,8.5581262136,8.897954458,9.4632393475,10.237948868,1.5708335151,0.9745131215,1.1460931706,0.8149408069,1.3033141174,0.6403596914,-0.027276896,-0.10556318,-0.683966598,-1.556467942,2.272338226,1.9423054628,1.5270006068,1.6062111339,1.6087783636,1.5464005314,1.0569797316,0.9058001859,0.6057017633,0.6471092099,-2.426736392,-6.774546389,-5.184386166,-6.309873633,-6.509782492,-5.732581705,0.55235715,0.262205317,0.4900059209,-1.304435934,-0.154398166,-4.832240927,-3.657385559,-4.7036625,-4.901004129,-4.186181174,1.6093368816,1.1680055029,1.0957076842,-0.657326724 +050,1,2,36,029,New York,Erie County,919040,919129,919160,919901,919998,921015,921934,920858,918992,919378,919941,918813,917241,31,741,97,1017,919,-1076,-1866,386,563,-1128,-1572,2553,9775,9814,10023,10027,10367,10087,9771,9833,9814,9679,2252,9741,9384,9848,9640,9977,9819,9831,9864,9725,10469,301,34,430,175,387,390,268,-60,-31,89,-790,515,2373,2639,2528,2840,2963,3099,2559,2400,1193,1213,-701,-1632,-2858,-1559,-2173,-4386,-5219,-2080,-1786,-2430,-2042,-186,741,-219,969,667,-1423,-2120,479,614,-1237,-829,-84,-34,-114,-127,-135,-43,-14,-33,-20,20,47,28387,28317,28552,28504,28186,28329,28213,28002,27685,27565,27103,27094,10.630424983,10.667976884,10.888570586,10.881473117,11.251405476,10.965024323,10.630069029,10.692000681,10.674619878,10.543262889,10.593449592,10.200559922,10.69845786,10.461494051,10.8281347,10.673696225,10.695344245,10.725708809,10.577815194,11.403804028,0.0369753912,0.4674169615,0.190112726,0.4199790662,0.4232707761,0.2913280974,-0.065275217,-0.033708128,0.096804684,-0.860541139,2.5806648067,2.868635724,2.7463141216,3.0820169196,3.2157725886,3.3687528875,2.7839879894,2.6096615106,1.2976178434,1.3213119004,-1.77481878,-3.10669227,-1.693632799,-2.35817703,-4.760168266,-5.673288583,-2.262874177,-1.942023107,-2.643094182,-2.22433545,0.8058460269,-0.238056545,1.0526813227,0.7238398892,-1.544395678,-2.304535696,0.5211138128,0.6676384031,-1.345476339,-0.903023549 +050,1,2,36,031,New York,Essex County,39370,39371,39359,39277,38884,38610,38333,37973,37695,37521,37309,36987,36891,-12,-82,-393,-274,-277,-360,-278,-174,-212,-322,-96,97,307,341,325,290,323,294,305,311,294,285,66,353,415,441,377,439,430,416,439,375,450,31,-46,-74,-116,-87,-116,-136,-111,-128,-81,-165,8,67,58,42,26,19,29,21,19,14,12,-48,-103,-383,-201,-217,-263,-170,-82,-100,-254,58,-40,-36,-325,-159,-191,-244,-141,-61,-81,-240,70,-3,0,6,1,1,0,-1,-2,-3,-1,-1,2647,2658,2637,2623,2495,2463,2257,2283,2237,2098,2117,2114,7.8081285925,8.7255792531,8.3877461481,7.5380476457,8.4659135586,7.7707881799,8.1099766007,8.3121742617,7.9142887908,7.715422724,8.9780761992,10.619106716,11.381526312,9.7994619394,11.506303567,11.365438494,11.061476282,11.733262061,10.094756111,12.182246406,-1.169947607,-1.893527463,-2.993780164,-2.261414294,-3.040390009,-3.594650315,-2.951499681,-3.421087799,-2.18046732,-4.466823682,1.7040541228,1.4841161193,1.0839548868,0.6758249613,0.4979949152,0.7665063171,0.5583918315,0.5078177202,0.3768708948,0.3248599042,-2.619665293,-9.800284029,-5.187498387,-5.6405391,-6.893298037,-4.493312893,-2.180387152,-2.672724843,-6.837514806,1.5701562035,-0.91561117,-8.31616791,-4.1035435,-4.964714139,-6.395303122,-3.726806576,-1.62199532,-2.164907123,-6.460643911,1.8950161076 +050,1,2,36,033,New York,Franklin County,51599,51597,51642,51544,51791,51222,51110,50552,51073,50478,50325,50102,49965,45,-98,247,-569,-112,-558,521,-595,-153,-223,-137,127,542,493,542,485,476,468,488,446,489,464,82,446,472,429,405,463,483,459,473,499,567,45,96,21,113,80,13,-15,29,-27,-10,-103,11,52,44,24,15,16,15,14,16,-4,1,-5,-247,185,-725,-206,-594,518,-645,-142,-210,-37,6,-195,229,-701,-191,-578,533,-631,-126,-214,-36,-6,1,-3,19,-1,7,3,7,0,1,2,6400,6430,6418,6591,6248,6284,6067,6765,6188,6182,6141,6139,10.505301107,9.5417815842,10.522943706,9.4789508658,9.3643642659,9.2103321033,9.6109344073,8.8489429878,9.7384169596,9.273786563,8.6445835675,9.1353365268,8.3290458486,7.9154125787,9.1086148217,9.5055350554,9.0397928135,9.3846413301,9.9375665907,11.332407287,1.8607175392,0.4064450573,2.1938978576,1.5635382871,0.2557494442,-0.295202952,0.5711415939,-0.535698342,-0.199149631,-2.058620724,1.0078886671,0.8515991678,0.4659606069,0.2931634288,0.3147685468,0.295202952,0.2757235281,0.3174508695,-0.079659852,0.019986609,-4.787471169,3.5805874099,-14.07589333,-4.026111089,-11.6857823,10.194341943,-12.70297683,-2.817376467,-4.182142253,-0.739504532,-3.779582502,4.4321865776,-13.60993273,-3.732947661,-11.37101375,10.489544895,-12.4272533,-2.499925597,-4.261802105,-0.719517923 +050,1,2,36,035,New York,Fulton County,55531,55509,55453,55116,54851,54353,53940,53812,53643,53815,53654,53336,52812,-56,-337,-265,-498,-413,-128,-169,172,-161,-318,-524,139,559,555,538,525,549,540,510,532,490,492,167,601,625,658,573,576,612,610,597,587,612,-28,-42,-70,-120,-48,-27,-72,-100,-65,-97,-120,2,21,20,23,15,21,11,9,10,2,5,-25,-317,-209,-402,-388,-116,-105,266,-103,-223,-408,-23,-296,-189,-379,-373,-95,-94,275,-93,-221,-403,-5,1,-6,1,8,-6,-3,-3,-3,0,-1,1474,1475,1295,1364,1308,1318,1385,1384,1433,1432,1360,1361,10.111333195,10.093937272,9.8531189334,9.695917557,10.190066078,10.050718906,9.4920806268,9.900529455,9.1597345546,9.2700757433,10.871039803,11.367046478,12.050840629,10.582401448,10.691216868,11.39081476,11.353272907,11.11018061,10.97298813,11.531069827,-0.759706609,-1.273109205,-2.197721695,-0.886483891,-0.501150791,-1.340095854,-1.86119228,-1.209651155,-1.813253575,-2.260994084,0.3798533043,0.3637454873,0.4212299916,0.2770262159,0.3897839483,0.2047368666,0.1675073052,0.1861001777,0.0373866717,0.0942080868,-5.733976069,-3.801140342,-7.362367679,-7.165744785,-2.153092286,-1.954306454,4.9507714642,-1.916831831,-4.168613889,-7.687379885,-5.354122765,-3.437394855,-6.941137687,-6.888718569,-1.763308338,-1.749569587,5.1182787694,-1.730731653,-4.131227217,-7.593171798 +050,1,2,36,037,New York,Genesee County,60079,59937,59932,59894,59684,59127,58745,58488,58024,57828,57509,57414,56994,-5,-38,-210,-557,-382,-257,-464,-196,-319,-95,-420,160,640,603,583,575,636,557,555,589,589,579,169,621,595,648,598,601,607,609,672,631,676,-9,19,8,-65,-23,35,-50,-54,-83,-42,-97,9,68,49,32,20,19,17,14,18,4,5,0,-124,-265,-532,-385,-309,-432,-153,-255,-58,-329,9,-56,-216,-500,-365,-290,-415,-139,-237,-54,-324,-5,-1,-2,8,6,-2,1,-3,1,1,1,1908,1917,1978,1978,1958,1949,1946,1919,1947,1961,1985,1985,10.682155793,10.085467226,9.8139061198,9.7563458667,10.850187234,9.5612469102,9.5811897939,10.213548124,10.250341533,10.121669813,10.365029292,9.9516633494,10.908080902,10.146599701,10.253085735,10.419527602,10.513413666,11.652808726,10.981265717,11.81735543,0.3171265001,0.133803877,-1.094174782,-0.390253835,0.5971014987,-0.858280692,-0.932223872,-1.439260602,-0.730924184,-1.695685616,1.134979053,0.8195487464,0.5386706618,0.3393511606,0.3241408136,0.2918154353,0.2416876705,0.3121288052,0.069611827,0.0874064751,-2.069667685,-4.432253425,-8.955399753,-6.532509841,-5.271553232,-7.41554518,-2.64130097,-4.42182474,-1.009371492,-5.75134606,-0.934688632,-3.612704678,-8.416729091,-6.193158681,-4.947412418,-7.123729745,-2.3996133,-4.109695935,-0.939759665,-5.663939585 +050,1,2,36,039,New York,Greene County,49221,49212,49137,48858,48589,48308,47963,47621,47481,47403,47401,47211,47177,-75,-279,-269,-281,-345,-342,-140,-78,-2,-190,-34,119,432,429,413,433,365,391,380,418,433,436,161,520,493,450,492,557,510,510,561,553,589,-42,-88,-64,-37,-59,-192,-119,-130,-143,-120,-153,3,29,54,48,82,60,35,39,50,2,15,-30,-220,-250,-293,-371,-207,-53,17,94,-73,103,-27,-191,-196,-245,-289,-147,-18,56,144,-71,118,-6,0,-9,1,3,-3,-3,-4,-3,1,1,3400,3414,3294,3415,3361,3318,3223,3214,3209,3215,3056,3055,8.8167763661,8.8047861915,8.5245157229,8.995439956,7.6372614664,8.2227503102,8.0097803634,8.8181933252,9.153172959,9.2384625164,10.612786367,10.118320728,9.2882132574,10.221146555,11.654670238,10.725326492,10.749968382,11.834943673,11.689849068,12.480400051,-1.796010001,-1.313534537,-0.763697534,-1.225706599,-4.017408771,-2.502576181,-2.740188019,-3.016750348,-2.536676109,-3.241937534,0.591866932,1.1082947654,0.9907427475,1.7035244258,1.255440241,0.736051818,0.8220564057,1.054807814,0.0422779351,0.3178370132,-4.490025001,-5.130994284,-6.047658854,-7.707409293,-4.331268832,-1.114592753,0.3583322794,1.9830386904,-1.543144633,2.1824808238,-3.898158069,-4.022699519,-5.056916107,-6.003884867,-3.075828591,-0.378540935,1.1803886851,3.0378465044,-1.500866698,2.500317837 +050,1,2,36,041,New York,Hamilton County,4836,4842,4852,4827,4803,4766,4701,4700,4558,4477,4453,4438,4345,10,-25,-24,-37,-65,-1,-142,-81,-24,-15,-93,10,37,35,35,22,29,29,29,22,15,18,4,49,67,58,72,54,52,67,79,52,67,6,-12,-32,-23,-50,-25,-23,-38,-57,-37,-49,0,0,0,0,0,-1,-1,0,0,0,0,5,-13,8,-13,-15,26,-117,-44,32,23,-44,5,-13,8,-13,-15,25,-118,-44,32,23,-44,-1,0,0,-1,0,-1,-1,1,1,-1,0,80,80,82,83,83,82,80,80,79,80,81,81,7.6454179151,7.2689511942,7.3152889539,4.6477236717,6.1695564302,6.2648520199,6.4194798008,4.9272116461,3.3741986278,4.09882728,10.125012915,13.914849429,12.122478838,15.210732016,11.48813956,11.23352776,14.831211954,17.693169093,11.69722191,15.256745987,-2.479594999,-6.645898235,-4.807189884,-10.56300834,-5.318583129,-4.96867574,-8.411732153,-12.76595745,-8.323023282,-11.15791871,0,0,0,0,-0.212743325,-0.21602938,0,0,0,0,-2.686227916,1.6614745587,-2.717107326,-3.168902503,5.5313264546,-25.27543746,-9.739900387,7.1668533035,5.1737712293,-10.01935557,-2.686227916,1.6614745587,-2.717107326,-3.168902503,5.3185831295,-25.49146684,-9.739900387,7.1668533035,5.1737712293,-10.01935557 +050,1,2,36,043,New York,Herkimer County,64519,64469,64470,64388,64232,63888,63393,62659,62434,62193,61760,61356,60945,1,-82,-156,-344,-495,-734,-225,-241,-433,-404,-411,172,658,650,664,675,637,604,633,600,565,565,178,644,646,702,701,714,695,680,687,681,701,-6,14,4,-38,-26,-77,-91,-47,-87,-116,-136,11,48,27,22,23,12,22,15,13,9,8,3,-141,-183,-327,-498,-673,-154,-207,-359,-296,-284,14,-93,-156,-305,-475,-661,-132,-192,-346,-287,-276,-7,-3,-4,-1,6,4,-2,-2,0,-1,1,1426,1424,1426,1427,1421,1421,1410,1387,1397,1404,1443,1443,10.212792376,10.1072928,10.365282548,10.606453438,10.106939993,9.6568153294,10.158312404,9.6810887998,9.1783358784,9.2394992682,9.9954989213,10.045094076,10.958476428,11.014998311,11.328658014,11.111732871,10.912563088,11.084846676,11.062737581,11.463520331,0.2172934548,0.0621987249,-0.593193881,-0.408544873,-1.221718021,-1.454917541,-0.754250684,-1.403757876,-1.884401702,-2.224021063,0.7450061308,0.4198413933,0.3434280362,0.3614050801,0.1903976137,0.3517383067,0.2407183034,0.209756924,0.1462035804,0.1308247684,-2.188455509,-2.845591665,-5.104589447,-7.825205647,-10.67813283,-2.462168147,-3.321912587,-5.792518132,-4.80847331,-4.644279278,-1.443449378,-2.425750272,-4.761161411,-7.463800567,-10.48773522,-2.11042984,-3.081194284,-5.582761208,-4.662269729,-4.51345451 +050,1,2,36,045,New York,Jefferson County,116229,116234,116609,117809,120335,118617,118121,116539,113280,113488,112266,110143,108095,375,1200,2526,-1718,-496,-1582,-3259,208,-1222,-2123,-2048,491,2139,2201,2269,2096,2138,2055,1969,1910,1793,1750,246,890,881,882,859,913,868,917,934,926,988,245,1249,1320,1387,1237,1225,1187,1052,976,867,762,146,156,1177,561,404,634,346,133,-27,15,55,-3,-201,25,-3741,-2172,-3476,-4814,-973,-2170,-2995,-2843,143,-45,1202,-3180,-1768,-2842,-4468,-840,-2197,-2980,-2788,-13,-4,4,75,35,35,22,-4,-1,-10,-22,6170,6154,6067,6181,5966,6160,6169,6151,6113,6111,6013,6015,18.249451834,18.484614351,18.991261843,17.707338915,18.222108583,17.883638864,17.365765893,16.921073381,16.123448242,16.037537001,7.5932735541,7.3988847084,7.3822357628,7.2569676182,7.7814710645,7.553770576,8.0875608551,8.2744934752,8.3270011555,9.0543351754,10.65617828,11.085729643,11.609026081,10.450371297,10.440637518,10.329868288,9.2782050377,8.6465799056,7.7964470862,6.9832018255,1.330955814,9.884775598,4.6955036995,3.4130557832,5.4035626012,3.0110652296,1.1730050095,-0.23919842,0.1348866278,0.5040368772,-1.714885376,0.2099570008,-31.31172788,-18.34939891,-29.62584164,-41.89383819,-8.581457701,-19.22446557,-26.93236335,-26.0541244,-0.383929562,10.094732599,-26.61622418,-14.93634313,-24.22227904,-38.88277296,-7.408452692,-19.46366399,-26.79747672,-25.55008752 +050,1,2,36,047,New York,Kings County,2504700,2504856,2509954,2540918,2568538,2587759,2601527,2608797,2608146,2594357,2580088,2562329,2538934,5098,30964,27620,19221,13768,7270,-651,-13789,-14269,-17759,-23395,10335,42204,41802,42474,41645,41999,41404,40121,39091,37873,37399,3733,16116,15380,15990,15852,15810,15859,16010,16067,17340,19573,6602,26088,26422,26484,25793,26189,25545,24111,23024,20533,17826,3869,17854,17170,14555,15676,15115,15518,11676,8908,7228,5772,-5394,-12941,-15535,-21661,-27666,-34130,-41753,-49631,-46164,-45373,-46757,-1525,4913,1635,-7106,-11990,-19015,-26235,-37955,-37256,-38145,-40985,21,-37,-437,-157,-35,96,39,55,-37,-147,-236,35609,35765,35412,36278,35798,35796,35682,35448,35594,35424,35313,35297,16.711569804,16.362602986,16.474613468,16.050377643,16.121454251,15.872897212,15.423729693,15.109253263,14.729649501,14.662643349,6.3814723477,6.0202103707,6.2021252849,6.1095110194,6.0687204865,6.0798057406,6.1547297522,6.2101346135,6.7439104997,7.673785884,10.330097456,10.342392615,10.272488183,9.940866624,10.052733765,9.7930914714,9.268999941,8.8991186494,7.9857390017,6.9888574653,7.069670346,6.7208720459,5.6455242978,6.0416789516,5.8019424512,5.9490778412,4.4886086563,3.4430745713,2.8111294747,2.2629689941,-5.124263691,-6.080882192,-8.401765841,-10.66273857,-13.10091273,-16.00669204,-19.07966223,-17.84307303,-17.64656581,-18.33153868,1.9454066545,0.6399898541,-2.756241543,-4.621059622,-7.298970275,-10.0576142,-14.59105358,-14.39999845,-14.83543633,-16.06856969 +050,1,2,36,049,New York,Lewis County,27087,27087,27072,27021,27190,27092,27085,26824,26656,26606,26503,26329,26187,-15,-51,169,-98,-7,-261,-168,-50,-103,-174,-142,93,285,340,338,350,333,336,335,310,328,315,81,236,232,239,247,264,239,244,251,256,295,12,49,108,99,103,69,97,91,59,72,20,-1,13,40,20,23,24,16,12,7,10,8,-26,-112,23,-219,-132,-358,-281,-154,-168,-257,-170,-27,-99,63,-199,-109,-334,-265,-142,-161,-247,-162,0,-1,-2,2,-1,4,0,1,-1,1,0,313,316,313,313,316,316,313,313,313,316,313,313,10.537407798,12.543579716,12.453483659,12.920612068,12.354152368,12.565445026,12.579324847,11.674104201,12.416717141,11.996343971,8.7257131237,8.5591485123,8.8058656645,9.1182605165,9.7942829583,8.937920718,9.1622545154,9.4522585626,9.6910963053,11.234671338,1.811694674,3.984431204,3.6476179949,3.8023515514,2.5598694096,3.6275243082,3.4170703316,2.2218456382,2.7256208359,0.7616726331,0.480653689,1.4757152607,0.7368925242,0.849068793,0.8903893598,0.5983545251,0.4506026811,0.2636088045,0.3785584494,0.3046690532,-4.141016398,0.8485362749,-8.06897314,-4.872916551,-13.28164128,-10.50860135,-5.782734407,-6.326611309,-9.72895215,-6.474217381,-3.660362709,2.3242515357,-7.332080616,-4.023847758,-12.39125192,-9.910246821,-5.332131726,-6.063002504,-9.350393701,-6.169548328 +050,1,2,36,051,New York,Livingston County,65393,65194,65226,64834,64780,64612,64574,64336,64013,63503,63281,62893,62398,32,-392,-54,-168,-38,-238,-323,-510,-222,-388,-495,144,565,573,517,520,492,555,502,506,500,502,108,558,536,537,517,515,563,545,627,548,592,36,7,37,-20,3,-23,-8,-43,-121,-48,-90,13,94,70,65,81,100,100,78,79,46,39,-10,-497,-151,-213,-115,-314,-417,-547,-180,-388,-443,3,-403,-81,-148,-34,-214,-317,-469,-101,-342,-404,-7,4,-10,0,-7,-1,2,2,0,2,-1,5758,5806,5667,5846,6004,6108,6032,5985,5874,5873,5739,5738,8.6882977087,8.8416374774,7.9912204773,8.0504079389,7.6332324878,8.6482948835,7.8735217541,7.9820797577,7.9255631113,8.013344933,8.5806550823,8.2707114972,8.3003586002,8.0039632778,7.9900705919,8.7729549899,8.5479469243,9.8908379606,8.6864171699,9.4500003991,0.1076426265,0.5709259802,-0.309138123,0.0464446612,-0.356838104,-0.124660106,-0.67442517,-1.908758203,-0.760854059,-1.436655466,1.4454866984,1.0801302328,1.0046988995,1.254005852,1.5514700178,1.5582513304,1.2233758901,1.2462140333,0.7291518062,0.622550702,-7.64262648,-2.329995217,-3.292321009,-1.780378679,-4.871615856,-6.497908048,-8.579315537,-2.839475013,-6.150236974,-7.071537461,-6.197139782,-1.249864984,-2.28762211,-0.526372827,-3.320145838,-4.939656717,-7.355939647,-1.593260979,-5.421085168,-6.448986759 +050,1,2,36,053,New York,Madison County,73442,73457,73442,72898,72438,72490,72251,71779,71426,70993,71180,70875,70478,-15,-544,-460,52,-239,-472,-353,-433,187,-305,-397,174,661,718,675,666,644,635,643,683,665,640,187,607,603,577,637,612,636,610,590,616,686,-13,54,115,98,29,32,-1,33,93,49,-46,4,29,29,36,38,40,43,34,24,22,18,2,-630,-615,-74,-307,-545,-393,-503,73,-378,-371,6,-601,-586,-38,-269,-505,-350,-469,97,-356,-353,-8,3,11,-8,1,1,-2,3,-3,2,2,5133,5155,4779,4647,4648,4645,4645,4641,4640,4722,4605,4599,9.0337570042,9.8805526504,9.3149701921,9.202644724,8.9425814067,8.8684054328,9.0296940717,9.6080127732,9.3625708352,9.055343714,8.2957496242,8.2980128805,7.9625745198,8.8019289628,8.4982295355,8.8823714256,8.5662727586,8.2997474907,8.6726971947,9.7061965434,0.7380073801,1.5825397699,1.3523956723,0.4007157613,0.4443518711,-0.013965993,0.4634213132,1.3082652824,0.6898736405,-0.650852829,0.3963372967,0.3990752463,0.4967984102,0.5250758251,0.5554398389,0.6005376907,0.4774643833,0.3376168471,0.3097391855,0.254681542,-8.610086101,-8.463147465,-1.021196732,-4.242059955,-7.567867805,-5.488635173,-7.063664258,1.0269179099,-5.32188237,-5.249269559,-8.213748804,-8.064072219,-0.524398322,-3.71698413,-7.012427966,-4.888097483,-6.586199875,1.364534757,-5.012143184,-4.994588017 +050,1,2,36,055,New York,Monroe County,744344,744396,744589,746821,747468,748456,747583,745847,744150,743528,744239,742605,740900,193,2232,647,988,-873,-1736,-1697,-622,711,-1634,-1705,2209,8611,8307,8520,8252,8460,8024,7892,7987,7715,7653,1540,6435,6525,6484,6403,6782,6536,6646,6818,6842,7288,669,2176,1782,2036,1849,1678,1488,1246,1169,873,365,436,2060,2206,2037,2254,2322,2589,2396,2589,761,1041,-888,-1987,-3305,-3068,-4993,-5753,-5781,-4267,-3048,-3286,-3135,-452,73,-1099,-1031,-2739,-3431,-3192,-1871,-459,-2525,-2094,-24,-17,-36,-17,17,17,7,3,1,18,24,26283,26281,26480,26419,26209,26164,26244,26221,26113,26357,25897,25887,11.547461798,11.118331193,11.390953016,11.031797968,11.329623752,10.770491484,10.609822825,10.736896302,10.37768589,10.317457643,8.6294177993,8.7332503953,8.668889596,8.5599372744,9.082447788,8.7731720265,8.9347291551,9.1654136703,9.2033865019,9.8253797594,2.9180439986,2.3850807976,2.7220634203,2.4718606935,2.2471759641,1.9973194577,1.6750936695,1.5714826314,1.1742993885,0.4920778831,2.7624865061,2.9525747697,2.7234003867,3.0132904289,3.1096201362,3.4751747822,3.2211271525,3.4803836891,1.0236447132,1.4034330858,-2.664592567,-4.423508438,-4.101812659,-6.674959677,-7.704411991,-7.759747167,-5.736456411,-4.097415792,-4.420100562,-4.226477161,0.0978939393,-1.470933668,-1.378412272,-3.661669248,-4.594791855,-4.284572385,-2.515329258,-0.617032102,-3.396455849,-2.823044075 +050,1,2,36,057,New York,Montgomery County,50219,50268,50312,49919,49836,49754,49689,49576,49242,49203,49502,49355,49170,44,-393,-83,-82,-65,-113,-334,-39,299,-147,-185,149,566,552,594,608,607,661,585,616,612,608,109,595,565,628,579,599,594,570,591,561,569,40,-29,-13,-34,29,8,67,15,25,51,39,11,79,95,117,162,128,151,153,210,19,56,-1,-444,-164,-165,-253,-249,-554,-206,69,-218,-281,10,-365,-69,-48,-91,-121,-403,-53,279,-199,-225,-6,1,-1,0,-3,0,2,-1,-5,1,1,920,915,902,904,922,925,927,894,916,911,922,922,11.293911065,11.06711443,11.928908525,12.228110576,12.229889689,13.378129491,11.884808776,12.481637202,12.381520783,12.342045166,11.872574353,11.327752995,12.611708003,11.644861881,12.068704982,12.022101237,11.58007009,11.97507725,11.349727384,11.550367927,-0.578663288,-0.260638564,-0.682799478,0.5832486952,0.1611847076,1.356028254,0.3047386866,0.5065599514,1.0317933985,0.7916772393,1.5763586116,1.9046664328,2.3496334973,3.2581478837,2.5789553216,3.0561233783,3.1083346031,4.2551035915,0.3843936191,1.1367673179,-8.859534475,-3.288055737,-3.313585701,-5.088342065,-5.016874024,-11.21253213,-4.185077962,1.3981054658,-4.410410998,-5.704136006,-7.283175864,-1.383389304,-0.963952204,-1.830194182,-2.437918702,-8.156408751,-1.076743359,5.6532090573,-4.026017379,-4.567368688 +050,1,2,36,059,New York,Nassau County,1339532,1339854,1341642,1346207,1349753,1352355,1354851,1354987,1356067,1357260,1357423,1356073,1351334,1788,4565,3546,2602,2496,136,1080,1193,163,-1350,-4739,3708,14304,14165,13781,14232,14316,14436,14213,14258,14029,13892,2604,10887,10734,11382,10549,11025,10862,11024,11018,11215,12111,1104,3417,3431,2399,3683,3291,3574,3189,3240,2814,1781,583,2999,3278,2952,3072,3125,3278,2506,1890,1445,1155,278,-1817,-3029,-2636,-4155,-6239,-5751,-4462,-4936,-5603,-7704,861,1182,249,316,-1083,-3114,-2473,-1956,-3046,-4158,-6549,-177,-34,-134,-113,-104,-41,-21,-40,-31,-6,29,21666,21697,21651,21510,21349,21140,20620,20583,20559,20117,19460,19453,10.643455045,10.508316147,10.200184449,10.514161095,10.565945271,10.649732539,10.47643723,10.504357231,10.340166339,10.262217687,8.1009015015,7.9630261577,8.4245337344,7.7932746898,8.1370177848,8.0131196206,8.1258174927,8.1173381938,8.2660892074,8.9465676937,2.5425535437,2.5452899895,1.7756507142,2.7208864047,2.4289274857,2.6366129188,2.3506197373,2.3870190368,2.0740771315,1.3156499928,2.2315241667,2.4317868218,2.1849607788,2.2694985162,2.3064109367,2.4182476631,1.8471787588,1.3924277715,1.0650467146,0.8532149027,-1.352010474,-2.24706598,-1.951069313,-3.069585395,-4.604703307,-4.242630357,-3.288951166,-3.63652036,-4.129727849,-5.691054208,0.8795136929,0.1847208416,0.2338914655,-0.800086879,-2.29829237,-1.824382694,-1.441772407,-2.244092588,-3.064681135,-4.837839305 +050,1,2,36,061,New York,New York County,1585873,1586609,1589041,1608717,1624573,1628379,1631733,1637327,1636721,1632337,1632393,1632326,1611989,2432,19676,15856,3806,3354,5594,-606,-4384,56,-67,-20337,5027,19712,19441,19015,18450,18295,17512,17363,17134,16906,16643,2290,10080,9482,9889,10106,10213,10022,9867,10067,11627,13234,2737,9632,9959,9126,8344,8082,7490,7496,7067,5279,3409,2515,11542,12505,11212,12379,11980,12590,9924,7909,6313,5118,-2625,-1565,-6469,-16531,-17308,-14395,-20690,-21780,-14841,-11592,-28743,-110,9977,6036,-5319,-4929,-2415,-8100,-11856,-6932,-5279,-23625,-195,67,-139,-1,-61,-73,4,-24,-79,-67,-121,67238,67172,67066,66708,66737,66874,68206,67867,68102,68456,68224,68180,12.328637752,12.025521992,11.690919509,11.318629544,11.192819954,10.697460758,10.622631963,10.496426963,10.356787215,10.259792899,6.3044170322,5.8652332454,6.0800159363,6.1997870012,6.2482793219,6.1220849542,6.0366013696,6.1671256122,7.1228182272,8.1582706981,6.0242207196,6.1602887461,5.6109035731,5.1188425428,4.9445406325,4.5753758039,4.5860305935,4.3293013511,3.2339689878,2.1015222011,7.2188076771,7.7351552134,6.8934309513,7.594217622,7.3293240259,7.6907852298,6.0714738007,4.8451173604,3.8674078841,3.155057385,-0.978810779,-4.001496927,-10.16369132,-10.61804012,-8.806812968,-12.63878844,-13.32493948,-9.09171662,-7.101376872,-17.71899461,6.2399968978,3.7336582861,-3.270260367,-3.023822494,-1.477488942,-4.948003206,-7.253465677,-4.246599259,-3.233968988,-14.56393723 +050,1,2,36,063,New York,Niagara County,216469,216479,216474,215726,214724,214125,213331,212391,211555,210911,210300,209563,208396,-5,-748,-1002,-599,-794,-940,-836,-644,-611,-737,-1167,542,2163,2164,2208,2153,2220,2104,2124,2125,2097,2041,595,2376,2299,2334,2394,2368,2350,2476,2396,2392,2530,-53,-213,-135,-126,-241,-148,-246,-352,-271,-295,-489,39,150,160,129,159,174,201,158,164,59,74,40,-680,-1016,-581,-688,-957,-787,-442,-499,-503,-759,79,-530,-856,-452,-529,-783,-586,-284,-335,-444,-685,-31,-5,-11,-21,-24,-9,-4,-8,-5,2,7,4319,4312,4199,4149,4143,4120,4089,3982,3990,3738,3733,3735,10.009254975,10.05459403,10.297330762,10.07355143,10.429341213,9.9257924358,10.055247049,10.089954916,9.9889725934,9.7665081982,10.994909764,10.681844581,10.884950181,11.201152867,11.124630627,11.086317597,11.72165334,11.376720931,11.394192868,12.106450633,-0.985654789,-0.627250552,-0.587619418,-1.127601437,-0.695289414,-1.160525161,-1.666406291,-1.286766015,-1.405220274,-2.339942435,0.6941230912,0.7434080613,0.601610357,0.743936218,0.8174348519,0.9482339732,0.7479891873,0.7787071088,0.2810440548,0.3541017181,-3.146691347,-4.720641189,-2.70957843,-3.219044767,-4.495891685,-3.712737,-2.092476081,-2.369358825,-2.396019654,-3.63193519,-2.452568255,-3.977233128,-2.107968073,-2.475108549,-3.678456833,-2.764503026,-1.344486894,-1.590651716,-2.114975599,-3.277833472 +050,1,2,36,065,New York,Oneida County,234878,234851,234752,234226,233778,233370,232634,231315,230372,229980,229431,228240,227346,-99,-526,-448,-408,-736,-1319,-943,-392,-549,-1191,-894,671,2620,2688,2653,2583,2549,2521,2482,2595,2455,2443,638,2519,2455,2615,2350,2650,2569,2568,2553,2520,2651,33,101,233,38,233,-101,-48,-86,42,-65,-208,132,589,620,579,652,640,602,512,500,216,240,-254,-1215,-1298,-1016,-1623,-1865,-1495,-814,-1092,-1346,-932,-122,-626,-678,-437,-971,-1225,-893,-302,-592,-1130,-692,-10,-1,-3,-9,2,7,-2,-4,1,4,6,13405,13369,13164,12864,12845,13098,12995,13174,13190,13108,12768,12765,11.173232007,11.487081307,11.358284741,11.085741753,10.988276729,10.92081865,10.783052968,11.297073862,10.728230541,10.724649133,10.742508177,10.491363322,11.1955954,10.085750337,11.423669412,11.12875173,11.156680106,11.114231048,11.012277378,11.637758842,0.4307238293,0.9957179853,0.1626893404,0.9999914164,-0.435392683,-0.20793308,-0.373627137,0.182842814,-0.284046837,-0.913109709,2.5118449053,2.6495500038,2.4788717922,2.7982592424,2.7589239334,2.6078273809,2.2243848186,2.1767001661,0.9439094896,1.0535881261,-5.181479728,-5.546961137,-4.349799207,-6.965605445,-8.039676775,-6.476249061,-3.536424301,-4.753913163,-5.881954504,-4.09143389,-2.669634823,-2.897411133,-1.870927415,-4.167346203,-5.280752841,-3.86842168,-1.312039483,-2.577212997,-4.938045015,-3.037845763 +050,1,2,36,067,New York,Onondaga County,467026,467068,467549,467679,467138,468302,467472,466320,464139,461843,461890,460870,459214,481,130,-541,1164,-830,-1152,-2181,-2296,47,-1020,-1656,1369,5318,5435,5373,5163,5339,5259,5173,5211,5176,5148,858,4178,4132,4170,4172,4436,4393,4400,4321,4234,4546,511,1140,1303,1203,991,903,866,773,890,942,602,292,1353,1466,1387,1558,1646,1645,1331,1141,757,695,-282,-2364,-3335,-1389,-3405,-3713,-4701,-4419,-1984,-2730,-2963,10,-1011,-1869,-2,-1847,-2067,-3056,-3088,-843,-1973,-2268,-40,1,25,-37,26,12,9,19,0,11,10,17069,17118,16930,16804,17123,17167,16854,16973,16856,16823,16666,16666,11.372627851,11.627944293,11.487642179,11.034715647,11.435094753,11.3040983,11.173003363,11.282480977,11.218518358,11.190282626,8.9347196619,8.8402329012,8.9155905242,8.9166828743,9.5010452006,9.4426514226,9.5034244726,9.3555172328,9.176817374,9.8817064529,2.4379081892,2.7877113916,2.5720516548,2.1180327729,1.9340495528,1.8614468773,1.6695788903,1.9269637439,2.041700984,1.3085761735,2.8934120877,3.1364427476,2.9654494142,3.3298638346,3.5254103698,3.5358892762,2.874785903,2.4704108222,1.640729984,1.5107316289,-5.055451719,-7.135086332,-2.969725477,-7.277398175,-7.952520476,-10.10469027,-9.544461987,-4.295613559,-5.917031514,-6.440716282,-2.162039631,-3.998643585,-0.004276063,-3.947534341,-4.427110106,-6.56880099,-6.669676084,-1.825202737,-4.27630153,-4.929984654 +050,1,2,36,069,New York,Ontario County,107931,108106,108183,108616,108641,109081,109378,109324,109348,109652,109962,109984,110091,77,433,25,440,297,-54,24,304,310,22,107,249,1048,1039,1044,1099,1026,1050,954,1009,935,953,284,1049,1023,1033,1062,1067,1065,1096,1071,1125,1186,-35,-1,16,11,37,-41,-15,-142,-62,-190,-233,15,117,120,99,140,136,174,150,172,51,74,107,322,-94,344,146,-139,-130,303,206,162,263,122,439,26,443,286,-3,44,453,378,213,337,-10,-5,-17,-14,-26,-10,-5,-7,-6,-1,3,3329,3330,3317,3363,3361,3354,3324,3145,3240,3207,3202,3203,9.6679412728,9.5647090773,9.5902113705,10.061384516,9.3826302457,9.6034243067,8.7123287671,9.1888495269,8.5020868759,8.6606838578,9.6771664076,9.4174180809,9.4891650821,9.7226481857,9.757569661,9.7406160825,10.00913242,9.7534765543,10.229783674,10.778143815,-0.009225135,0.1472909964,0.1010462884,0.3387363304,-0.374939415,-0.137191776,-1.296803653,-0.564627027,-1.727696798,-2.117459957,1.0793407719,1.1046824728,0.9094165955,1.2817050339,1.2437014751,1.5914245994,1.3698630137,1.5663846567,0.4637501932,0.672498012,2.9704934063,-0.865334604,3.1599930186,1.3366352496,-1.271136066,-1.18899539,2.7671232877,1.876018833,1.4730888491,2.390094286,4.0498341782,0.2393478691,4.0694096141,2.6183402835,-0.027434591,0.402429209,4.1369863014,3.4424034898,1.9368390423,3.0625922981 +050,1,2,36,071,New York,Orange County,372813,372823,373451,374171,373795,374417,374945,375911,377894,379896,382411,384950,385234,628,720,-376,622,528,966,1983,2002,2515,2539,284,1264,4925,4892,4696,4808,4879,4866,5013,5055,5126,5072,522,2601,2445,2660,2637,2663,2674,2730,2824,2857,3131,742,2324,2447,2036,2171,2216,2192,2283,2231,2269,1941,126,422,555,410,404,448,459,334,297,137,142,-236,-2031,-3456,-1841,-2064,-1699,-659,-606,-1,137,-1800,-110,-1609,-2901,-1431,-1660,-1251,-200,-272,296,274,-1658,-4,5,78,17,17,1,-9,-9,-12,-4,1,12230,12198,12002,11641,11474,11328,11095,11373,11364,11320,11076,11057,13.175107207,13.080808486,12.552592046,12.8322493,12.995834088,12.910500726,13.230578392,13.262373296,13.360074333,13.170878647,6.9580616943,6.5377303246,7.110284251,7.0379869809,7.0932375848,7.0946730255,7.2051623801,7.4090884644,7.4462997207,8.1305246538,6.2170455123,6.5430781613,5.4423077951,5.7942623191,5.9025965032,5.8158277008,6.0254160124,5.8532848314,5.9137746119,5.0403539933,1.1289127393,1.4840246749,1.0959460688,1.0782505651,1.1933047082,1.2178215852,0.8815107088,0.7792136239,0.357067925,0.3687430536,-5.433226952,-9.241061759,-4.921065153,-5.508686056,-4.525501561,-1.748462799,-1.599387693,-0.002623615,0.357067925,-4.674207722,-4.304314212,-7.757037085,-3.825119084,-4.43043549,-3.332196853,-0.530641214,-0.717876984,0.776590009,0.71413585,-4.305464668 +050,1,2,36,073,New York,Orleans County,42883,42891,42850,42653,42396,42233,41864,41482,41270,40815,40708,40351,39978,-41,-197,-257,-163,-369,-382,-212,-455,-107,-357,-373,110,433,401,408,403,448,441,383,390,342,336,117,412,423,423,416,444,392,459,434,399,448,-7,21,-22,-15,-13,4,49,-76,-44,-57,-112,8,22,28,21,17,26,37,39,58,-2,15,-42,-241,-265,-166,-380,-414,-301,-418,-120,-298,-277,-34,-219,-237,-145,-363,-388,-264,-379,-62,-300,-262,0,1,2,-3,7,2,3,0,-1,0,1,2586,2577,2562,2597,2743,2747,2736,2743,2689,2668,2518,2522,10.128299592,9.4298580818,9.6420848645,9.5841706601,10.750365944,10.658352668,9.3317902175,9.5678520172,8.4382980298,8.3655964845,9.6370887571,9.9472069043,9.9965732787,9.8933374556,10.654380534,9.4740912606,11.183529268,10.647301988,9.8446810348,11.154128646,0.4912108347,-0.517348822,-0.354488414,-0.309166795,0.0959854102,1.1842614076,-1.851739051,-1.079449971,-1.406383005,-2.788532161,0.5146018268,0.6584439558,0.4962837798,0.4042950403,0.6239051664,0.8942382057,0.950234513,1.4229113256,-0.049346772,0.3734641288,-5.637229103,-6.231701725,-3.923005116,-9.037183253,-9.934489958,-7.274748647,-10.18456478,-2.943954467,-7.352669044,-6.896637578,-5.122627276,-5.573257769,-3.426721337,-8.632888212,-9.310584791,-6.380510441,-9.234330267,-1.521043141,-7.402015816,-6.523173449 +050,1,2,36,075,New York,Oswego County,122109,122109,122141,121987,121469,121187,120611,119764,118907,118444,117520,116934,116346,32,-154,-518,-282,-576,-847,-857,-463,-924,-586,-588,343,1339,1335,1331,1309,1267,1260,1302,1239,1192,1189,220,1073,998,1117,1076,1097,1022,1101,1165,1049,1174,123,266,337,214,233,170,238,201,74,143,15,12,49,56,47,71,66,60,43,44,15,22,-99,-468,-930,-540,-887,-1092,-1160,-709,-1047,-748,-629,-87,-419,-874,-493,-816,-1026,-1100,-666,-1003,-733,-607,-4,-1,19,-3,7,9,5,2,5,4,4,4954,4916,4851,4704,4873,4935,4866,4911,4807,4534,4249,4249,10.969655263,10.967074132,10.970262429,10.827219415,10.541861674,10.558467514,10.971093444,10.501601939,10.168305936,10.193758573,8.7904705728,8.1986067298,9.2064486351,8.8999909015,9.1274050962,8.5640903168,9.2773992947,9.8743876185,8.9484504423,10.06515775,2.17918469,2.7684674027,1.763813794,1.9272285131,1.4144565783,1.9943771971,1.6936941492,0.6272143208,1.219855494,0.128600823,0.4014287587,0.460042061,0.387379665,0.5872670576,0.5491419657,0.5027841673,0.3623325792,0.3729382448,0.12795687,0.1886145405,-3.834054267,-7.639984227,-4.450745088,-7.336702537,-9.085803432,-9.720493902,-5.974274387,-8.874235053,-6.380782584,-5.39266118,-3.432625508,-7.179942166,-4.063365423,-6.749435479,-8.536661466,-9.217709734,-5.611941808,-8.501296808,-6.252825714,-5.204046639 +050,1,2,36,077,New York,Otsego County,62259,62278,62260,61979,61763,61637,60973,60524,60135,59955,59828,59347,58701,-18,-281,-216,-126,-664,-449,-389,-180,-127,-481,-646,128,531,518,545,541,533,485,510,476,520,489,112,614,601,589,607,617,549,626,666,633,694,16,-83,-83,-44,-66,-84,-64,-116,-190,-113,-205,9,32,34,46,45,47,61,46,36,27,21,-39,-229,-157,-120,-658,-413,-385,-109,30,-394,-462,-30,-197,-123,-74,-613,-366,-324,-63,66,-367,-441,-4,-1,-10,-8,15,1,-1,-1,-3,-1,0,5320,5311,5386,5479,5494,5360,5214,5170,5260,5342,5235,5237,8.5480404704,8.3722584086,8.8330632091,8.8247288149,8.7738791904,8.0391848101,8.4936297777,7.947705434,8.7266624712,8.2847655191,9.8841748565,9.7137592733,9.546191248,9.9013131066,10.156629382,9.1000256922,10.425514198,11.120108864,10.623033354,11.757928978,-1.336134386,-1.341500865,-0.713128039,-1.076584292,-1.382750191,-1.060840882,-1.93188442,-3.17240343,-1.896370883,-3.473163459,0.5151361489,0.5495304747,0.7455429498,0.7340347443,0.7736816547,1.0111139658,0.7660920976,0.6010869656,0.4531151668,0.3557874763,-3.686443065,-2.53753778,-1.944894652,-10.73321915,-6.798521774,-6.381620932,-1.815305188,0.5009058047,-6.612125026,-7.827324478,-3.171306917,-1.988007306,-1.199351702,-9.999184406,-6.02484012,-5.370506966,-1.04921309,1.1019927703,-6.159009859,-7.471537002 +050,1,2,36,079,New York,Putnam County,99710,99633,99644,99805,99600,99546,99407,99158,98753,98901,98871,98511,98532,11,161,-205,-54,-139,-249,-405,148,-30,-360,21,247,909,833,822,792,859,801,773,878,830,830,187,676,627,704,644,715,728,695,735,704,856,60,233,206,118,148,144,73,78,143,126,-26,28,109,109,99,133,135,170,131,109,95,76,-75,-180,-526,-273,-419,-525,-651,-55,-280,-582,-29,-47,-71,-417,-174,-286,-390,-481,76,-171,-487,47,-2,-1,6,2,-1,-3,3,-6,-2,1,0,2592,2598,2591,2590,2586,2589,2573,2573,2583,2583,2578,2578,9.1151121339,8.3548556957,8.2552499171,7.9616793916,8.6520786644,8.0945475492,7.8217491171,8.8789110693,8.4100880526,8.4245570764,6.7786752503,6.288708909,7.0701897101,6.4738908184,7.2016719966,7.356842217,7.0324911208,7.4328014077,7.1333758904,8.6884588643,2.3364368836,2.0661467867,1.1850602071,1.4877885732,1.4504066678,0.7377053322,0.7892579963,1.4461096616,1.2767121622,-0.263901788,1.093011246,1.093252426,0.994245428,1.3369991908,1.3597562511,1.7179439243,1.3255486861,1.1022793924,0.9626004398,0.7714052263,-1.8049727,-5.275695193,-2.741707089,-4.212050082,-5.287940977,-6.578714675,-0.556528074,-2.831543393,-5.897194273,-0.294351994,-0.711961454,-4.182442767,-1.747461661,-2.875050891,-3.928184725,-4.86077075,0.7690206118,-1.729264001,-4.934593833,0.477053232 +050,1,2,36,081,New York,Queens County,2230722,2230511,2234574,2255261,2271920,2286788,2298234,2305252,2306249,2295226,2275286,2253942,2225821,4063,20687,16659,14868,11446,7018,997,-11023,-19940,-21344,-28121,7602,30802,30122,30887,30297,30566,30352,29772,28877,27322,26781,3340,13884,13827,14452,14087,14763,14192,14648,14637,15759,17672,4262,16918,16295,16435,16210,15803,16160,15124,14240,11563,9109,4313,19537,19681,16700,17610,17401,18551,13651,10456,8604,6849,-4565,-15800,-19372,-18183,-22396,-26284,-33801,-39899,-44732,-41418,-43870,-252,3737,309,-1483,-4786,-8883,-15250,-26248,-34276,-32814,-37021,53,32,55,-84,22,98,87,101,96,-93,-209,28000,27988,27863,27624,27608,27621,27633,27644,27765,27594,27760,27742,13.720771476,13.307177248,13.550769209,13.215639969,13.279501665,13.163609853,12.940198523,12.636221062,12.064749224,11.956436088,6.1846370746,6.1084370163,6.3403929359,6.1447905812,6.4138350806,6.15504583,6.3666541707,6.4049716968,6.9588018091,7.8897030937,7.5361344014,7.1987402315,7.2103762733,7.0708493874,6.865666584,7.0085640229,6.5735443526,6.2312493655,5.1059474153,4.0667329946,8.7027697009,8.6945938322,7.3266372841,7.6815334801,7.559923067,8.0455365834,5.933314861,4.5754173712,3.7993229751,3.0577510462,-7.038120555,-8.558085042,-7.977260224,-9.769200671,-11.41917234,-14.65943518,-17.34183061,-19.57417462,-18.28920955,-19.58585756,1.6646491463,0.1365087899,-0.65062294,-2.087667191,-3.859249273,-6.613898598,-11.40851575,-14.99875725,-14.48988658,-16.52810651 +050,1,2,36,083,New York,Rensselaer County,159429,159435,159342,159606,159466,159590,159719,159413,159311,159214,159452,158981,158108,-93,264,-140,124,129,-306,-102,-97,238,-471,-873,429,1720,1676,1665,1731,1616,1679,1647,1588,1584,1568,418,1482,1457,1547,1461,1503,1466,1505,1518,1531,1724,11,238,219,118,270,113,213,142,70,53,-156,58,266,316,255,291,256,288,209,174,123,113,-154,-235,-668,-235,-410,-666,-600,-439,-2,-651,-836,-96,31,-352,20,-119,-410,-312,-230,172,-528,-723,-8,-5,-7,-14,-22,-9,-3,-9,-4,4,6,5607,5602,5924,5951,5941,5920,5762,5796,5775,5800,5687,5690,10.785457191,10.505465851,10.437039266,10.842162294,10.127470764,10.535761348,10.341417471,9.9665480472,9.9487176266,9.8899678008,9.2930509048,9.1327349313,9.6973572038,9.1510104632,9.4192998508,9.1991817372,9.4498077074,9.5272165841,9.6158375545,10.873918679,1.4924062857,1.3727309197,0.7396820621,1.691151831,0.7081709136,1.3365796112,0.8916097638,0.439331463,0.3328800721,-0.983950878,1.6679834957,1.9807441581,1.5984654731,1.8226858623,1.6043518043,1.8072062349,1.3122988776,1.0920524938,0.7725329975,0.7127336489,-1.473594442,-4.187142714,-1.473095632,-2.568045373,-4.173821491,-3.765012989,-2.756455537,-0.012552328,-4.088772206,-5.272967526,0.194389054,-2.206398556,0.125369841,-0.745359511,-2.569469687,-1.957806754,-1.44415666,1.0795001663,-3.316239209,-4.560233878 +050,1,2,36,085,New York,Richmond County,468730,468730,469607,471014,470597,471783,471899,472301,474160,475819,476531,476141,475327,877,1407,-417,1186,116,402,1859,1659,712,-390,-814,1378,5696,5400,5368,5352,5273,5456,5407,5332,5136,5086,780,3322,3188,3640,3566,3740,3628,3694,3785,3986,4496,598,2374,2212,1728,1786,1533,1828,1713,1547,1150,590,156,807,908,662,799,857,1020,679,457,266,250,180,-1773,-3596,-1152,-2442,-1964,-974,-712,-1282,-1814,-1681,336,-966,-2688,-490,-1643,-1107,46,-33,-825,-1548,-1431,-57,-1,59,-52,-27,-24,-15,-21,-10,8,27,7838,8053,7817,7051,7088,7097,7051,7027,7059,6988,7027,7017,12.111147848,11.469704581,11.392431928,11.342804038,11.169243804,11.529265337,11.383409528,11.197563921,10.782304928,10.690848247,7.0634187414,6.7713737414,7.7251215009,7.5576306425,7.922050413,7.6664542966,7.7770140182,7.9487583346,8.3680427261,9.4506594021,5.0477291066,4.6983308394,3.6673104268,3.7851733953,3.2471933912,3.8628110403,3.6063955098,3.2488055862,2.4142622015,1.240188845,1.7158876955,1.9286095851,1.4049534158,1.6933670453,1.81529337,2.1553978452,1.4295052838,0.9597311913,0.558429344,0.5255037479,-3.769849918,-7.637973643,-2.444873618,-5.175472246,-4.160135564,-2.058193629,-1.498980504,-2.692287499,-3.808236203,-3.533487201,-2.053962223,-5.709364058,-1.039920202,-3.482105201,-2.344842194,0.0972042165,-0.06947522,-1.732556308,-3.249806859,-3.007983453 +050,1,2,36,087,New York,Rockland County,311687,311691,312497,315448,317201,319290,321120,322938,323231,324600,325656,326352,326225,806,2951,1753,2089,1830,1818,293,1369,1056,696,-127,1122,4556,4640,4622,4846,5218,5211,5320,5582,5750,5617,451,1972,1975,2156,2002,2054,2168,2196,2270,2385,2631,671,2584,2665,2466,2844,3164,3043,3124,3312,3365,2986,333,1132,1120,836,839,895,845,699,572,421,342,-189,-759,-2060,-1206,-1870,-2249,-3611,-2464,-2840,-3096,-3458,144,373,-940,-370,-1031,-1354,-2766,-1765,-2268,-2675,-3116,-9,-6,28,-7,17,8,16,10,12,6,3,7183,7180,7266,7179,7057,6997,6954,6718,6629,6535,6492,6497,14.510824993,14.668481259,14.523378964,15.134054746,16.203509622,16.128907453,16.424036516,17.168622819,17.637820395,17.214826756,6.2808048476,6.2435884669,6.7746441034,6.2522446558,6.3783075437,6.7103188175,6.7795459001,6.9818656037,7.3158611551,8.0634162712,8.2300201451,8.4248927921,7.7487348604,8.8818100904,9.8252020781,9.4185886355,9.6444906156,10.186757216,10.32195924,9.1514104849,3.6054113019,3.5406678901,2.6269028156,2.6201964367,2.7792528002,2.6154148528,2.1579702114,1.7593071037,1.2913951976,1.0481521721,-2.417409168,-6.512299869,-3.789527267,-5.840008744,-6.98384307,-11.17664264,-7.606922176,-8.735021284,-9.49681599,-10.59798307,1.1880021339,-2.971631979,-1.162624452,-3.219812308,-4.20459027,-8.56122779,-5.448951964,-6.97571418,-8.205420792,-9.549830901 +050,1,2,36,089,New York,St. Lawrence County,111944,111941,111821,112290,112388,111967,111476,110399,109506,108768,108534,107766,107185,-120,469,98,-421,-491,-1077,-893,-738,-234,-768,-581,310,1273,1219,1245,1225,1142,1138,1090,1088,1032,1045,282,1012,1038,989,968,917,947,990,998,1092,1180,28,261,181,256,257,225,191,100,90,-60,-135,21,133,191,137,154,164,174,138,96,92,80,-172,78,-256,-825,-906,-1484,-1263,-981,-419,-802,-529,-151,211,-65,-688,-752,-1320,-1089,-843,-323,-710,-449,3,-3,-18,11,4,18,5,5,-1,2,3,10751,10668,11196,11364,11239,11365,11090,10963,10617,10750,10453,10455,11.360441924,10.851084663,11.098482316,10.964765063,10.294084507,10.349923831,9.9874469703,10.013713634,9.5423023578,9.7231462054,9.0312389843,9.2398899759,8.8163847474,8.664402107,8.265915493,8.6128100771,9.0711674318,9.1853733514,10.097087379,10.979246433,2.3292029396,1.6111946875,2.2820975686,2.3003629561,2.0281690141,1.7371137537,0.9162795386,0.8283402822,-0.554785021,-1.256100227,1.1869118428,1.7002109686,1.2212787769,1.3784276079,1.4783098592,1.5825015348,1.2644657632,0.8835629677,0.8506703652,0.7443556904,0.6960836371,-2.278816796,-7.354415993,-8.109450732,-13.37690141,-11.48677838,-8.988702273,-3.856384203,-7.415626445,-4.922052003,1.8829954799,-0.578605827,-6.133137216,-6.731023124,-11.89859155,-9.904276847,-7.72423651,-2.972821235,-6.56495608,-4.177696312 +050,1,2,36,091,New York,Saratoga County,219607,219598,220123,221136,222527,224151,224605,226182,227189,229314,230127,229635,230298,525,1013,1391,1624,454,1577,1007,2125,813,-492,663,629,2172,2193,2248,2240,2267,2218,2157,2068,2014,1989,369,1678,1625,1721,1671,1789,1809,1881,2037,2004,2244,260,494,568,527,569,478,409,276,31,10,-255,85,191,432,361,338,422,327,185,84,91,81,197,337,432,746,-435,698,283,1670,706,-597,830,282,528,864,1107,-97,1120,610,1855,790,-506,911,-17,-9,-41,-10,-18,-21,-12,-6,-8,4,7,3950,3913,3875,3885,3892,3469,3456,3430,3400,3397,3409,3405,9.8445584113,9.8858818518,10.065416251,9.9831534286,10.057965292,9.7844811424,9.4501021899,9.0022440313,8.7610546326,8.6490858451,7.6055105958,7.3253798491,7.7057746296,7.4472541871,7.9372297781,7.9802192906,8.2409096983,8.8672974332,8.7175538648,9.7579430047,2.2390478155,2.5605020026,2.359641621,2.5358992415,2.1207355137,1.8042618518,1.2091924916,0.1349465981,0.0435007678,-1.10885716,0.8657047222,1.9474240584,1.6163768979,1.5063865441,1.8722811439,1.4425272018,0.81050946,0.3656617498,0.3958569869,0.3522252154,1.5274475988,1.9474240584,3.3402137558,-1.938692742,3.0968062522,1.2484256823,7.3164908007,3.0732999449,-2.596995837,3.6092213431,2.393152321,3.8948481167,4.9565906537,-0.432306198,4.969087396,2.6909528841,8.1270002607,3.4389616948,-2.20113885,3.9614465585 +050,1,2,36,093,New York,Schenectady County,154727,154758,154867,154882,155044,154978,155050,154773,154473,154716,155334,155548,155358,109,15,162,-66,72,-277,-300,243,618,214,-190,448,1826,1858,1837,1758,1792,1717,1744,1892,1806,1828,358,1518,1513,1563,1499,1658,1430,1637,1640,1493,1575,90,308,345,274,259,134,287,107,252,313,253,76,287,329,302,371,439,418,348,327,199,185,-35,-577,-488,-633,-544,-844,-1004,-204,46,-302,-634,41,-290,-159,-331,-173,-405,-586,144,373,-103,-449,-22,-3,-24,-9,-14,-6,-1,-8,-7,4,6,4434,4423,4512,4561,4407,4540,4570,4569,4573,4571,4537,4538,11.790191413,11.989958893,11.850771881,11.340911144,11.567895218,11.10442819,11.281125784,12.204483148,11.618556237,11.759181232,9.8014844277,9.7636209934,10.083155389,9.6700943141,10.702885196,9.2483007056,10.588992493,10.578938881,9.6049304881,10.131679672,1.9887069853,2.2263379,1.7676164917,1.6708168294,0.8650100219,1.8561274843,0.6921332906,1.6255442671,2.0136257487,1.62750156,1.8531133272,2.1230874467,1.948248834,2.3933322152,2.8338761164,2.703349437,2.2510503284,2.1093372037,1.2802285111,1.1900703106,-3.725597177,-3.149138827,-4.083581165,-3.509360445,-5.448272078,-6.493212523,-1.319581227,0.2967263345,-1.942859349,-4.078403119,-1.87248385,-1.02605138,-2.135332331,-1.11602823,-2.614395962,-3.789863086,0.9314691014,2.4060635381,-0.662630837,-2.888332808 +050,1,2,36,095,New York,Schoharie County,32749,32723,32684,32619,32038,31902,31768,31408,31318,31260,31182,31052,31132,-39,-65,-581,-136,-134,-360,-90,-58,-78,-130,80,80,299,265,251,270,240,247,240,281,262,277,88,266,252,276,290,300,280,290,296,315,338,-8,33,13,-25,-20,-60,-33,-50,-15,-53,-61,2,15,24,9,8,9,10,8,5,5,4,-32,-112,-640,-121,-118,-309,-67,-13,-67,-82,138,-30,-97,-616,-112,-110,-300,-57,-5,-62,-77,142,-1,-1,22,1,-4,0,0,-3,-1,0,-1,1556,1556,1483,1303,1351,1419,1387,1289,1265,1268,1236,1236,9.157312834,8.1971016286,7.851110416,8.4812313491,7.5978219577,7.875522112,7.6704273067,9.000352327,8.419834817,8.9090441271,8.1466395112,7.7949796619,8.6330935252,9.1094707083,9.4972774471,8.927717374,9.2684329956,9.4807981807,10.123083845,10.870963592,1.0106733228,0.4021219667,-0.781983109,-0.628239359,-1.899455489,-1.052195262,-1.598005689,-0.480445854,-1.703249028,-1.961919465,0.4593969649,0.7423790154,0.2815139193,0.2512957437,0.2849183234,0.3188470491,0.2556809102,0.1601486179,0.1606838706,0.1286504567,-3.430164005,-19.79677374,-3.784798248,-3.706612219,-9.782195771,-2.136275229,-0.415481479,-2.14599148,-2.635215477,4.4384407565,-2.97076704,-19.05439473,-3.503284329,-3.455316476,-9.497277447,-1.81742818,-0.159800569,-1.985842862,-2.474531607,4.5670912132 +050,1,2,36,097,New York,Schuyler County,18343,18369,18341,18421,18505,18391,18184,18037,17976,17910,17842,17812,17685,-28,80,84,-114,-207,-147,-61,-66,-68,-30,-127,47,167,192,171,153,174,183,156,148,182,172,69,214,193,196,184,186,195,219,204,187,197,-22,-47,-1,-25,-31,-12,-12,-63,-56,-5,-25,0,7,13,8,8,10,4,5,4,4,1,-3,119,75,-96,-191,-146,-51,-7,-15,-30,-102,-3,126,88,-88,-183,-136,-47,-2,-11,-26,-101,-3,1,-3,-1,7,1,-2,-1,-1,1,-1,354,354,379,414,364,203,199,216,201,203,203,203,9.0854686905,10.399176732,9.2692974848,8.3663704716,9.6076861489,10.162996696,8.6941982946,8.2792571045,10.209233186,9.6909597994,11.642456885,10.453339111,10.624457936,10.06151743,10.270285194,10.829422708,12.205316837,11.411948982,10.489706625,11.099529538,-2.556988194,-0.054162379,-1.355160451,-1.695146958,-0.662599045,-0.666426013,-3.511118542,-3.132691877,-0.280473439,-1.408569738,0.3808280289,0.7041109246,0.4336513443,0.4374572796,0.5521658706,0.2221420043,0.2786602017,0.2237637055,0.2243787513,0.0563427895,6.474076492,4.0621784109,-5.203816132,-10.44429255,-8.061621711,-2.832310555,-0.390124282,-0.839113896,-1.682840635,-5.746964532,6.854904521,4.7662893354,-4.770164788,-10.00683527,-7.509455841,-2.61016855,-0.111464081,-0.61535019,-1.458461884,-5.690621743 +050,1,2,36,099,New York,Seneca County,35251,35253,35271,35325,35354,35244,34891,34814,34725,34293,34277,34189,33991,18,54,29,-110,-353,-77,-89,-432,-16,-88,-198,113,366,384,354,414,385,343,353,382,369,381,66,314,331,329,336,370,356,390,397,328,339,47,52,53,25,78,15,-13,-37,-15,41,42,3,8,17,11,23,15,36,30,26,14,15,-28,-4,-34,-148,-460,-105,-112,-427,-25,-142,-256,-25,4,-17,-137,-437,-90,-76,-397,1,-128,-241,-4,-2,-7,2,6,-2,0,2,-2,-1,1,2809,2823,2834,2911,2854,2810,2783,2782,2700,2688,2670,2670,10.368859425,10.866028099,10.028612709,11.805803094,11.046553332,9.8649678598,10.229215567,11.14189879,10.779072824,11.176298035,8.895688141,9.3662898456,9.3203773478,9.5815213517,10.616168137,10.23885877,11.301399635,11.579407904,9.5813980662,9.9442651804,1.4731712845,1.4997382532,0.7082353608,2.2242817424,0.4303851947,-0.37389091,-1.072184068,-0.437509115,1.1976747583,1.2320328542,0.2266417361,0.481048119,0.3116235587,0.6558779497,0.4303851947,1.0353902127,0.8693384335,0.7583491323,0.4089621126,0.4400117336,-0.113320868,-0.962096238,-4.192753336,-13.11755899,-3.012696363,-3.221213995,-12.3735837,-0.729181858,-4.148044285,-7.509533588,0.113320868,-0.481048119,-3.881129777,-12.46168104,-2.582311168,-2.185823782,-11.50424527,0.0291672743,-3.739082172,-7.069521854 +050,1,2,36,101,New York,Steuben County,98990,98946,98969,99117,98903,98826,98153,97549,96975,96379,95876,95328,94657,23,148,-214,-77,-673,-604,-574,-596,-503,-548,-671,316,1105,1126,1116,1057,1093,1060,984,1058,1027,1018,215,959,980,945,1010,994,960,989,1107,1021,1097,101,146,146,171,47,99,100,-5,-49,6,-79,13,56,50,40,54,90,102,78,57,53,41,-83,-52,-400,-283,-782,-795,-776,-669,-510,-608,-634,-70,4,-350,-243,-728,-705,-674,-591,-453,-555,-593,-8,-2,-10,-5,8,2,0,0,-1,1,1,1583,1587,1588,1581,1760,1732,1829,1800,1837,1768,1656,1656,11.156770292,11.372588627,11.288177253,10.732108499,11.170044251,10.898398141,10.178222328,11.006215703,10.742453087,10.716635524,9.6826630857,9.897990102,9.5585371898,10.254900269,10.158301908,9.8702473731,10.229940937,11.515955372,10.679692893,11.548280127,1.474107206,1.4745985254,1.7296400629,0.4772082303,1.0117423429,1.028150768,-0.051718609,-0.509739669,0.0627601933,-0.831644604,0.5654109831,0.504999495,0.4045941668,0.5482817965,0.9197657663,1.0487137834,0.8068103065,0.5929624717,0.5543817075,0.4316130221,-0.525024484,-4.03999596,-2.86250373,-7.939932683,-8.124597602,-7.97844996,-6.919949936,-5.305453694,-6.359699588,-6.674211122,0.0403864988,-3.534996465,-2.457909563,-7.391650887,-7.204831836,-6.929736177,-6.11313963,-4.712491223,-5.80531788,-6.2425981 +050,1,2,36,103,New York,Suffolk County,1493350,1493116,1494337,1498910,1497017,1497389,1495553,1491997,1486699,1483862,1482275,1478325,1474273,1221,4573,-1893,372,-1836,-3556,-5298,-2837,-1587,-3950,-4052,4372,16465,16060,15620,15554,15817,15856,15298,15494,15223,15140,2713,11569,11443,11940,11572,11774,11797,12473,12326,13092,14189,1659,4896,4617,3680,3982,4043,4059,2825,3168,2131,951,788,3442,3352,2830,2903,2882,3233,2645,2165,1611,1315,-1138,-3738,-9978,-6071,-8728,-10498,-12614,-8311,-6933,-7731,-6376,-350,-296,-6626,-3241,-5825,-7616,-9381,-5666,-4768,-6120,-5061,-88,-27,116,-67,7,17,24,4,13,39,58,29406,29312,29222,29110,28967,28860,28552,28588,29219,29112,29399,29392,11.001430888,10.721222513,10.432787003,10.393786448,10.588609396,10.646269374,10.299737996,10.447258505,10.283726272,10.255375097,7.7300670476,7.6390379338,7.9748704751,7.7328595075,7.8820438152,7.9209157296,8.3977403595,8.3111467879,8.8441532122,9.6111966478,3.27136384,3.0821845793,2.4579165284,2.6609269408,2.7065655805,2.7253536447,1.9019976361,2.136111717,1.4395730595,0.6441784489,2.2998436146,2.2377047238,1.8901912433,1.939897265,1.9293400947,2.1707485423,1.7808084062,1.4598111955,1.0882929136,0.8907409678,-2.497622147,-6.661043477,-4.05489436,-5.832388332,-7.02783217,-8.469477919,-5.595576054,-4.674767214,-5.222590016,-4.318908297,-0.197778533,-4.423338753,-2.164703116,-3.892491067,-5.098492075,-6.298729377,-3.814767648,-3.214956019,-4.134297102,-3.428167329 +050,1,2,36,105,New York,Sullivan County,77547,77504,77480,77061,76940,76957,75651,74850,74913,75000,75381,75551,75802,-24,-419,-121,17,-1306,-801,63,87,381,170,251,210,845,867,916,783,817,797,847,804,892,859,150,728,766,734,726,706,749,696,734,751,837,60,117,101,182,57,111,48,151,70,141,22,28,146,160,161,157,144,144,123,168,10,48,-110,-684,-384,-325,-1550,-1067,-125,-182,145,20,180,-82,-538,-224,-164,-1393,-923,19,-59,313,30,228,-2,2,2,-1,30,11,-4,-5,-2,-1,1,3825,3819,3826,3839,3826,3821,3826,3802,3790,3789,3773,3773,10.935609321,11.259667145,11.904065706,10.261585238,10.857070717,10.64348337,11.299887268,10.692840186,11.819892402,11.350947784,9.42144803,9.9479873507,9.5388474109,9.5145732858,9.3819974618,10.00247057,9.2853855236,9.761871513,9.9515013384,11.060236665,1.5141612905,1.3116797943,2.3652182954,0.7470119522,1.4750732553,0.6410128002,2.0145017443,0.9309686729,1.8683910635,0.290711119,1.8894662258,2.077908585,2.092308492,2.0575592367,1.9136085475,1.9230384007,1.640951752,2.234324815,0.1325100045,0.6342788052,-8.852019852,-4.986980604,-4.223604099,-20.31348291,-14.17930778,-1.669304167,-2.42807495,1.9284351082,0.265020009,2.3785455194,-6.962553627,-2.909072019,-2.131295607,-18.25592367,-12.26569923,0.2537342334,-0.787123198,4.1627599231,0.3975300135,3.0128243246 +050,1,2,36,107,New York,Tioga County,51125,51052,51012,50889,50297,50128,49855,49390,48858,48659,48515,48221,47904,-40,-123,-592,-169,-273,-465,-532,-199,-144,-294,-317,131,469,473,518,492,527,466,449,445,429,427,125,413,443,407,400,452,470,467,453,494,530,6,56,30,111,92,75,-4,-18,-8,-65,-103,0,-7,-5,-9,-4,4,6,2,2,-2,0,-44,-172,-633,-272,-362,-550,-536,-181,-138,-227,-215,-44,-179,-638,-281,-366,-546,-530,-179,-136,-229,-215,-2,0,16,1,1,6,2,-2,0,0,1,523,526,522,523,524,517,490,504,520,494,479,480,9.2050127084,9.3491194434,10.316156336,9.8416730844,10.620182377,9.4861981923,9.2086507993,9.1588284932,8.8695004962,8.8842652796,8.1059067134,8.7561520368,8.1055514065,8.0013602312,9.1087712227,9.5676247863,9.5778172011,9.3234815897,10.213364208,11.027308192,1.099105995,0.5929674066,2.2106049291,1.8403128532,1.5114111542,-0.081426594,-0.369166402,-0.164653097,-1.343863712,-2.143042913,-0.137388249,-0.098827901,-0.179238237,-0.080013602,0.0806085949,0.1221398909,0.0410184891,0.0411632741,-0.041349653,0,-3.375825556,-12.51161228,-5.416977844,-7.241231009,-11.0836818,-10.91116359,-3.712173262,-2.840265915,-4.693185577,-4.473342003,-3.513213806,-12.61044018,-5.596216082,-7.321244612,-11.0030732,-10.7890237,-3.671154773,-2.799102641,-4.73453523,-4.473342003 +050,1,2,36,109,New York,Tompkins County,101564,101581,101743,101861,102800,103668,103530,103187,103042,102731,102382,101971,101058,162,118,939,868,-138,-343,-145,-311,-349,-411,-913,245,843,933,917,855,862,791,805,724,736,721,121,691,654,677,686,707,678,709,735,652,686,124,152,279,240,169,155,113,96,-11,84,35,184,859,878,779,869,863,813,616,459,406,331,-150,-898,-217,-136,-1204,-1379,-1077,-1030,-804,-906,-1278,34,-39,661,643,-335,-516,-264,-414,-345,-500,-947,4,5,-1,-15,28,18,6,7,7,5,-1,13232,13225,13118,13073,13271,13190,13084,13044,13092,12988,12891,12890,8.2807803383,9.117516283,8.8827324331,8.2529754148,8.3399043136,7.6710840861,7.8241557444,7.0595232872,7.2032218759,7.1024336425,6.7876859001,6.3910564299,6.5579169653,6.6216855375,6.8402695473,6.575214931,6.891088724,7.1667812377,6.3811150313,6.7576553103,1.4930944382,2.7264598531,2.3248154678,1.6312898773,1.4996347664,1.0958691552,0.9330670205,-0.10725795,0.8221068445,0.3447783322,8.4379481739,8.5800421184,7.5459635391,8.3881118544,8.3495793766,7.8844391429,5.9871800479,4.4755817525,3.9735164152,3.2606179413,-8.821044773,-2.120579886,-1.317395432,-11.6217338,-13.34191189,-10.44469982,-10.01103157,-7.839581109,-8.867009537,-12.58933453,-0.383096599,6.4594622327,6.2285681074,-3.233621946,-4.992332513,-2.560260681,-4.023851526,-3.363999356,-4.893493122,-9.328716587 +050,1,2,36,111,New York,Ulster County,182493,182522,182422,182458,181555,180722,180435,179696,179045,178650,178510,177933,177716,-100,36,-903,-833,-287,-739,-651,-395,-140,-577,-217,419,1738,1638,1594,1562,1554,1531,1491,1472,1567,1517,416,1582,1614,1617,1620,1718,1739,1783,1743,1716,1868,3,156,24,-23,-58,-164,-208,-292,-271,-149,-351,66,295,291,291,324,305,303,245,215,139,139,-159,-411,-1228,-1107,-527,-872,-742,-339,-75,-571,-11,-93,-116,-937,-816,-203,-567,-439,-94,140,-432,128,-10,-4,10,6,-26,-8,-4,-9,-9,4,6,11773,11767,11782,11800,11773,11818,11800,11759,11821,11774,11670,11664,9.5264196448,8.9996785829,8.799896212,8.6499777105,8.630192902,8.5354057663,8.3367114441,8.2428043454,8.7924296451,8.5308829773,8.6713440035,8.8678151604,8.926870875,8.9711676639,9.5409725905,9.6950167391,9.9693873272,9.7603315041,9.6284679458,10.504739223,0.8550756413,0.1318634225,-0.126974663,-0.321189953,-0.910779689,-1.159610973,-1.632675883,-1.517527159,-0.836038301,-1.973856246,1.6169699627,1.5988439973,1.6065055193,1.7942335328,1.6938280792,1.6892409844,1.3698821622,1.2039422108,0.7799283476,0.7816695675,-2.25279544,-6.747011783,-6.111345738,-2.91839837,-4.842682246,-4.136689143,-1.895469604,-0.419979841,-3.20387832,-0.061858743,-0.635825477,-5.148167785,-4.504840219,-1.124164837,-3.148854167,-2.447448159,-0.525587442,0.7839623698,-2.423949972,0.7198108247 +050,1,2,36,113,New York,Warren County,65707,65698,65668,65750,65438,65111,64893,64449,64525,64406,64269,63980,63756,-30,82,-312,-327,-218,-444,76,-119,-137,-289,-224,152,619,611,599,565,531,608,517,586,539,547,185,635,662,632,700,763,675,731,723,715,727,-33,-16,-51,-33,-135,-232,-67,-214,-137,-176,-180,5,20,24,27,39,51,52,33,26,22,16,8,81,-280,-322,-109,-261,95,65,-22,-135,-61,13,101,-256,-295,-70,-210,147,98,4,-113,-45,-10,-3,-5,1,-13,-2,-4,-3,-4,0,1,738,739,735,721,679,696,672,661,650,660,611,608,9.420322939,9.3148763606,9.1766309968,8.6920402449,8.2107899986,9.428256858,8.019793533,9.1082183796,8.4055236298,8.5645393624,9.6638207856,10.092386499,9.6821882971,10.768899418,11.798178473,10.467225953,11.339398593,11.237614144,11.150184407,11.382852133,-0.243497847,-0.777510138,-0.5055573,-2.076859174,-3.587388474,-1.038969095,-3.31960506,-2.129395765,-2.744660777,-2.81831277,0.3043723082,0.3658871238,0.4136377912,0.599981539,0.788606949,0.8063640734,0.5119017149,0.4041189042,0.3430825971,0.2505166907,1.2327078482,-4.268683111,-4.933013658,-1.676871481,-4.035812033,1.4731651341,1.0082912566,-0.341946765,-2.105279573,-0.955094883,1.5370801564,-3.902795987,-4.519375867,-1.076889942,-3.247205084,2.2795292074,1.5201929714,0.0621721391,-1.762196976,-0.704578193 +050,1,2,36,115,New York,Washington County,63216,63254,63359,63100,63016,62785,62504,62277,61812,61600,61335,61168,60606,105,-259,-84,-231,-281,-227,-465,-212,-265,-167,-562,131,638,658,623,584,600,543,569,563,536,531,112,624,601,614,572,644,580,627,666,703,732,19,14,57,9,12,-44,-37,-58,-103,-167,-201,0,13,13,9,13,18,21,13,10,8,5,88,-288,-143,-244,-305,-197,-449,-164,-169,-8,-367,88,-275,-130,-235,-292,-179,-428,-151,-159,0,-362,-2,2,-11,-5,-1,-4,0,-3,-3,0,1,3164,3179,3131,3191,3166,3163,3135,3101,3066,3074,3053,3054,10.090226872,10.434837768,9.9045317605,9.3224465037,9.616848719,8.7517829945,9.2211454316,9.1593118315,8.7508061027,8.721073464,9.8688112353,9.5309080529,9.7614486371,9.1308893837,10.322084292,9.3481291654,10.161086442,10.834994103,11.477269944,12.022270764,0.2214156367,0.9039297155,0.1430831233,0.1915571199,-0.705235573,-0.596346171,-0.939941011,-1.675682271,-2.726463842,-3.3011973,0.2056002341,0.2061594088,0.1430831233,0.2075202133,0.2885054616,0.3384667456,0.2106764334,0.1626875991,0.1306090463,0.0821193358,-4.554835955,-2.267753497,-3.879142455,-4.868743465,-3.157531996,-7.236741371,-2.657764237,-2.749420425,-0.130609046,-6.027559249,-4.349235721,-2.061594088,-3.736059332,-4.661223252,-2.869026534,-6.898274625,-2.447087803,-2.586732826,0,-5.945439913 +050,1,2,36,117,New York,Wayne County,93772,93751,93751,93258,93038,92360,91819,91316,90823,90429,90110,89816,89339,0,-493,-220,-678,-541,-503,-493,-394,-319,-294,-477,257,992,1014,991,930,960,1002,931,974,979,962,230,856,820,851,815,861,880,871,941,877,953,27,136,194,140,115,99,122,60,33,102,9,19,63,62,30,56,53,35,18,26,17,17,-38,-695,-479,-859,-723,-655,-650,-471,-379,-412,-505,-19,-632,-417,-829,-667,-602,-615,-453,-353,-395,-488,-8,3,3,11,11,0,0,-1,1,-1,2,1390,1409,1347,1355,1305,1118,1138,1101,1073,1111,1062,1060,10.609115069,10.885902005,10.690514461,10.098871207,10.484069129,11.002585937,10.272990091,10.789912429,10.882251592,10.739303955,9.1546396163,8.8031949156,9.1802500566,8.8500860576,9.4028995004,9.6629497252,9.6109284311,10.424340447,9.7484521414,10.638832296,1.4544754531,2.0827070898,1.5102644041,1.2487851492,1.081169629,1.3396362119,0.66206166,0.3655719817,1.1337994509,0.1004716586,0.6737643643,0.6656074204,0.3236280866,0.6081040727,0.5788079832,0.3843218641,0.198618498,0.2880264098,0.1889665751,0.1897797996,-7.432797352,-5.142354103,-9.26655088,-7.851057938,-7.153193,-7.137406047,-5.197184031,-4.19853882,-4.579660527,-5.6375764,-6.759032988,-4.476746683,-8.942922793,-7.242953866,-6.574385017,-6.753084183,-4.998565533,-3.91051241,-4.390693952,-5.447796601 +050,1,2,36,119,New York,Westchester County,949113,949376,950760,956423,959731,964713,967180,968891,970461,970033,968928,968467,965802,1384,5663,3308,4982,2467,1711,1570,-428,-1105,-461,-2665,2857,10976,10619,10549,10585,10774,10507,10349,10273,10050,9924,1514,7088,6904,7229,6906,7019,6810,7280,7321,7472,8141,1343,3888,3715,3320,3679,3755,3697,3069,2952,2578,1783,723,3620,3458,2866,3339,3543,3980,2960,2487,1882,1500,-615,-1815,-3837,-1041,-4476,-5562,-6110,-6465,-6550,-4942,-5988,108,1805,-379,1825,-1137,-2019,-2130,-3505,-4063,-3060,-4488,-67,-30,-28,-163,-75,-25,3,8,6,21,40,28844,28863,28949,28888,28406,28208,27825,27786,28047,28105,27876,27871,11.510169711,11.08366029,10.963166504,10.958163832,11.129757122,10.835578069,10.666356093,10.59639673,10.374755793,10.26124081,7.4329521603,7.2061013885,7.512819287,7.1494642819,7.2507671465,7.0229643716,7.5032440193,7.551466997,7.7134502773,8.4176502855,4.0772175507,3.8775589018,3.4503472172,3.8086995501,3.8789899751,3.8126136978,3.1631120735,3.044929733,2.6613055159,1.8435905244,3.7961747771,3.6093132389,2.9785226278,3.4567131824,3.6599897421,4.104463759,3.0507695463,2.5652914112,1.9428149655,1.5509735202,-1.903330724,-4.00489731,-1.08187092,-4.633797006,-5.745657055,-6.301073761,-6.663251729,-6.756195715,-5.101695834,-6.191486293,1.8928440532,-0.395584071,1.8966517082,-1.177083824,-2.085667313,-2.196610002,-3.612482182,-4.190904304,-3.158880868,-4.640512773 +050,1,2,36,121,New York,Wyoming County,42155,42154,42125,41852,41702,41369,41145,40939,40450,40296,40068,39858,39465,-29,-273,-150,-333,-224,-206,-489,-154,-228,-210,-393,91,414,379,377,396,386,389,354,373,345,355,72,382,357,395,362,379,373,374,397,380,384,19,32,22,-18,34,7,16,-20,-24,-35,-29,4,14,14,11,10,5,23,11,19,5,5,-50,-322,-188,-330,-270,-217,-532,-145,-224,-180,-368,-46,-308,-174,-319,-260,-212,-509,-134,-205,-175,-363,-2,3,2,4,2,-1,4,0,1,0,-1,3961,3956,3912,3836,3815,3865,3832,3574,3425,3441,3337,3333,9.8598425759,9.0719774038,9.076573052,9.5983711855,9.4049997563,9.5590313187,8.7682361975,9.2827634264,8.6329855116,8.9507456854,9.0977291401,8.5453718553,9.5099372826,8.774268609,9.2344427659,9.1658577941,9.2636167736,9.8800457916,9.508795636,9.6819333611,0.7621134358,0.5266055485,-0.433364231,0.8241025765,0.1705569904,0.3931735247,-0.495380576,-0.597282365,-0.875810124,-0.731187676,0.3334246282,0.3351126218,0.2648336965,0.2423831107,0.1218264217,0.5651869417,0.2724593169,0.4728485391,0.1251157321,0.1260668406,-7.668766448,-4.500083778,-7.945010894,-6.54434399,-5.287266702,-13.0730197,-3.591509177,-5.574635409,-4.504166354,-9.278519471,-7.33534182,-4.164971156,-7.680177198,-6.301960879,-5.165440281,-12.50783275,-3.31904986,-5.10178687,-4.379050622,-9.15245263 +050,1,2,36,123,New York,Yates County,25348,25364,25376,25453,25341,25219,25162,25145,25080,25021,24959,24902,24780,12,77,-112,-122,-57,-17,-65,-59,-62,-57,-122,75,311,307,323,298,289,321,325,328,333,331,37,241,255,269,230,283,255,248,298,264,290,38,70,52,54,68,6,66,77,30,69,41,2,7,16,9,34,21,17,13,10,9,7,-27,2,-183,-188,-158,-42,-148,-149,-101,-134,-171,-25,9,-167,-179,-124,-21,-131,-136,-91,-125,-164,-1,-2,3,3,-1,-2,0,0,-1,-1,1,1293,1283,1367,1334,1279,1250,1314,1305,1307,1378,1369,1369,12.237108737,12.088041895,12.776898734,11.829856494,11.489454748,12.782478845,12.973792938,13.1252501,13.357132829,13.324745381,9.4827755809,10.040555971,10.640822785,9.1304261527,11.250919355,10.154305625,9.900001996,11.924769908,10.589438639,11.674248219,2.7543331563,2.0474859235,2.1360759494,2.6994303408,0.2385353927,2.6281732205,3.0737909423,1.2004801921,2.7676941898,1.650497162,0.2754333156,0.6299956688,0.3560126582,1.3497151704,0.8348738744,0.6769537083,0.5189517175,0.400160064,0.36100359,0.2817921984,0.078695233,-7.205575462,-7.436708861,-6.272205792,-1.669747749,-5.893479343,-5.94798507,-4.041616647,-5.37494234,-6.883780846,0.3541285487,-6.575579793,-7.080696203,-4.922490621,-0.834873874,-5.216525635,-5.429033353,-3.641456583,-5.01393875,-6.601988648 +040,3,5,37,000,North Carolina,North Carolina,9535483,9535762,9574586,9658913,9751810,9846717,9937295,10037218,10161802,10275758,10391358,10501384,10600823,38824,84327,92897,94907,90578,99923,124584,113956,115600,110026,99439,29905,121039,119579,119380,120184,120819,121074,119793,120147,119140,118855,18643,79977,79531,84364,83529,88474,89243,92189,93730,95192,102921,11262,41062,40048,35016,36655,32345,31831,27604,26417,23948,15934,4867,10843,22624,20169,18908,22402,21565,21393,16207,16329,13387,20632,32211,29397,39006,34313,44814,70976,64769,72887,69731,70229,25499,43054,52021,59175,53221,67216,92541,86162,89094,86060,83616,2063,211,828,716,702,362,212,190,89,18,-111,257464,272504,269846,269000,268403,267476,269416,277273,276201,280752,282872,279336,12.586269404,12.320921792,12.182548209,12.149608482,12.097316215,11.988106354,11.72282797,11.626876241,11.404917555,11.264698522,8.3164274997,8.1945427793,8.6092184377,8.4440911176,8.8586890704,8.8363692892,9.0215270316,9.0704479522,9.1124468009,9.7545247281,4.2698419045,4.1263790123,3.5733297712,3.7055173642,3.2386271445,3.1517370645,2.7013009381,2.5564282893,2.2924707537,1.5101737937,1.1275119519,2.3310826701,2.0582159057,1.9114424314,2.2430584415,2.1352521063,2.0934984411,1.5683852551,1.5631265633,1.2687772421,3.3494685496,3.0289443624,3.9805032286,3.4687605325,4.487118159,7.0276676789,6.3382321569,7.05342729,6.6751410609,6.656081044,4.4769805016,5.3600270325,6.0387191344,5.3802029639,6.7301766006,9.1629197852,8.431730598,8.6218125451,8.2382676242,7.9248582861 +050,3,5,37,001,North Carolina,Alamance County,151131,151160,151437,152712,153299,154209,155439,157104,160358,163326,166516,169173,171346,277,1275,587,910,1230,1665,3254,2968,3190,2657,2173,479,1759,1703,1797,1727,1782,1845,1834,2016,1904,1942,391,1459,1494,1591,1548,1635,1693,1640,1680,1805,1879,88,300,209,206,179,147,152,194,336,99,63,16,38,79,93,108,140,64,70,82,25,36,176,938,331,629,950,1379,3021,2694,2764,2537,2078,192,976,410,722,1058,1519,3085,2764,2846,2562,2114,-3,-1,-32,-18,-7,-1,17,10,8,-4,-4,4229,4229,4266,4147,4229,4512,4508,5956,6007,6305,6234,6238,11.566699217,11.130318845,11.687500813,11.154601354,11.403230915,11.623438396,11.332039891,12.224034538,11.343833131,11.406118308,9.593981897,9.7643548761,10.347698271,9.9984498527,10.462560352,10.665843471,10.133339924,10.186695448,10.754001472,11.036094902,1.9727173195,1.3659639686,1.3398025417,1.1561515011,0.9406705637,0.9575949247,1.1986999666,2.0373390896,0.5898316597,0.3700234054,0.2498775271,0.5163213087,0.6048623125,0.6975662688,0.8958767274,0.4031978631,0.4325206065,0.497207754,0.1489473888,0.211441946,6.1680294855,2.1633209264,4.0909504793,6.1359995866,8.8243857645,19.032199129,16.645864485,16.759539416,15.115181016,12.204898992,6.4179070127,2.6796422351,4.6958127919,6.8335658554,9.7202624919,19.435396992,17.078385092,17.25674717,15.264128405,12.416340938 +050,3,5,37,003,North Carolina,Alexander County,37198,37182,37232,37029,36926,37016,36993,36960,37120,37105,37272,37417,37441,50,-203,-103,90,-23,-33,160,-15,167,145,24,80,355,363,373,349,347,327,374,369,345,344,57,331,365,363,338,400,391,420,431,382,431,23,24,-2,10,11,-53,-64,-46,-62,-37,-87,6,-3,4,18,9,10,4,2,-1,0,0,26,-225,-103,68,-37,15,222,30,230,184,109,32,-228,-99,86,-28,25,226,32,229,184,109,-5,1,-2,-6,-6,-5,-2,-1,0,-2,2,1161,1161,1160,1271,1386,1426,1432,1505,1507,1499,1488,1450,9.5608731366,9.8167804746,10.088988667,9.4312853842,9.3843387016,8.8282937365,10.077467161,9.9224222542,9.2383081846,9.1907344572,8.9145042485,9.8708674194,9.8185063969,9.1340242403,10.8176815,10.556155508,11.316941731,11.589604313,10.229083265,11.515135323,0.6463688881,-0.054086945,0.2704822699,0.2972611439,-1.433342799,-1.727861771,-1.239474571,-1.667182059,-0.990775081,-2.324400866,-0.080796111,0.1081738895,0.4868680858,0.2432136632,0.2704420375,0.1079913607,0.0538901987,-0.026890033,0,0,-6.059708326,-2.785477655,1.8392794352,-0.999878393,0.4056630563,5.9935205184,0.8083529808,6.1847076381,4.9270976985,2.9121803949,-6.140504437,-2.677303766,2.326147521,-0.75666473,0.6761050938,6.101511879,0.8622431795,6.1578176049,4.9270976985,2.9121803949 +050,3,5,37,005,North Carolina,Alleghany County,11155,11150,11136,11016,10944,10903,10891,10855,10928,11004,11165,11134,11194,-14,-120,-72,-41,-12,-36,73,76,161,-31,60,26,93,85,86,100,97,99,94,105,81,84,48,135,122,114,112,135,146,146,138,145,154,-22,-42,-37,-28,-12,-38,-47,-52,-33,-64,-70,0,-2,0,-3,1,6,14,8,13,7,6,10,-74,-36,-9,1,-4,107,120,181,26,125,10,-76,-36,-12,2,2,121,128,194,33,131,-2,-2,1,-1,-2,0,-1,0,0,0,-1,111,111,110,110,110,110,110,112,111,109,102,102,8.3965330444,7.7413479053,7.872934499,9.1768376617,8.9211809068,9.089657072,8.5719496626,9.4726870856,7.2648997713,7.52418488,12.18851571,11.111111111,10.436215499,10.278058181,12.41607652,13.404948813,13.313879263,12.449817312,13.005067492,13.794338947,-3.791982665,-3.369763206,-2.563281,-1.101220519,-3.494895613,-4.315291741,-4.741929601,-2.977130227,-5.740167721,-6.270154067,-0.180570603,0,-0.27463725,0.0917683766,0.5518256231,1.2854060506,0.7295276309,1.1728088773,0.6278308444,0.5374417771,-6.681112315,-3.278688525,-0.82391175,0.0917683766,-0.367883749,9.8241748152,10.942914463,16.329108214,2.3319431365,11.19670369,-6.861682918,-3.278688525,-1.098549,0.1835367532,0.1839418744,11.109580866,11.672442094,17.501917091,2.9597739809,11.734145468 +050,3,5,37,007,North Carolina,Anson County,26948,26929,26853,26515,26315,25966,25976,25616,25173,24856,24487,23538,24097,-76,-338,-200,-349,10,-360,-443,-317,-369,-949,559,60,277,254,264,255,237,240,264,244,274,256,97,304,274,296,293,314,353,312,293,325,312,-37,-27,-20,-32,-38,-77,-113,-48,-49,-51,-56,5,-3,7,2,24,33,32,35,28,33,29,-43,-310,-189,-328,17,-318,-364,-307,-352,-933,590,-38,-313,-182,-326,41,-285,-332,-272,-324,-900,619,-1,2,2,9,7,2,2,3,4,2,-4,2484,2484,2477,2462,2322,2579,2552,2246,2044,1702,807,1425,10.380752511,9.6157486277,10.099271246,9.818643872,9.1874709257,9.4508653449,10.55387875,9.8899539955,11.410723581,10.748399286,11.392594813,10.372894189,11.323425336,11.281814331,12.172429834,13.900647778,12.472765796,11.876051314,13.534617387,13.09961163,-1.011842303,-0.757145561,-1.22415409,-1.463170459,-2.984958908,-4.449782433,-1.918887046,-1.986097319,-2.123893805,-2.351212344,-0.112426923,0.2650009464,0.0765096306,0.9241076585,1.2792681036,1.2601153793,1.3991884707,1.1349127536,1.374284227,1.2175921066,-11.61744866,-7.155025554,-12.54757943,0.6545762581,-12.32749263,-14.33381244,-12.27288173,-14.26747462,-38.85476314,24.77170148,-11.72987558,-6.890024607,-12.4710698,1.5786839167,-11.04822453,-13.07369706,-10.87369326,-13.13256186,-37.48047892,25.989293587 +050,3,5,37,009,North Carolina,Ashe County,27281,27239,27226,26983,26921,26837,26761,26625,26595,26795,27122,27215,27166,-13,-243,-62,-84,-76,-136,-30,200,327,93,-49,62,249,244,252,221,218,207,217,206,202,203,102,329,319,327,336,358,352,327,326,338,391,-40,-80,-75,-75,-115,-140,-145,-110,-120,-136,-188,3,8,19,0,-7,-6,-4,-6,0,-8,-2,27,-172,1,-3,52,13,122,316,447,236,143,30,-164,20,-3,45,7,118,310,447,228,141,-3,1,-7,-6,-6,-3,-3,0,0,1,-2,369,369,363,365,313,326,324,319,325,319,323,324,9.1866664207,9.053131493,9.3753487853,8.2465763648,8.1669351515,7.7790304397,8.128863083,7.6413747056,7.4350810681,7.4658428495,12.138205833,11.835856337,12.165631162,12.53778126,13.411755891,13.228109733,12.249484922,12.092660942,12.440878223,14.380022434,-2.951539412,-2.782724844,-2.790282377,-4.291204896,-5.24482074,-5.449079293,-4.120621839,-4.451286236,-5.005797155,-6.914179585,0.2951539412,0.7049569605,0,-0.261203776,-0.224778032,-0.150319429,-0.224761191,0,-0.294458656,-0.073555102,-6.345809736,0.0371029979,-0.111611295,1.9403709094,0.4870190687,4.584742578,11.837422738,16.58104123,8.6865303568,5.2591897906,-6.050655795,0.7420599584,-0.111611295,1.6791671331,0.262241037,4.4344231492,11.612661547,16.58104123,8.3920717007,5.1856346886 +050,3,5,37,011,North Carolina,Avery County,17797,17805,17797,17771,17617,17663,17658,17494,17450,17522,17509,17496,17571,-8,-26,-154,46,-5,-164,-44,72,-13,-13,75,37,176,133,141,138,122,149,130,145,140,148,55,193,189,184,180,188,222,182,231,195,242,-18,-17,-56,-43,-42,-66,-73,-52,-86,-55,-94,-1,1,10,8,7,9,9,14,14,12,12,11,-9,-109,81,31,-106,20,112,60,30,158,10,-8,-99,89,38,-97,29,126,74,42,170,0,-1,1,0,-1,-1,0,-2,-1,0,-1,2414,2452,2528,2491,2555,2572,2480,2509,2501,2507,2474,2449,9.8965362123,7.5166723183,7.9931972789,7.8140482999,6.9412835685,8.5279304029,7.4345190438,8.2783820045,7.9988573061,8.4409844013,10.852451642,10.681586979,10.430839002,10.192236913,10.696404188,12.706043956,10.408326661,13.188318918,11.141265533,13.80215017,-0.95591543,-3.16491466,-2.437641723,-2.378188613,-3.755120619,-4.178113553,-2.973807618,-4.909936913,-3.142408227,-5.361165768,0.0562303194,0.5651633322,0.4535147392,0.3963647688,0.5120619026,0.5151098901,0.8006405124,0.7992920556,0.6856163405,0.6844041406,-0.506072874,-6.160280321,4.5918367347,1.7553296906,-6.030951297,1.1446886447,6.4051240993,3.4255373812,1.7140408513,9.0113211852,-0.449842555,-5.595116989,5.0453514739,2.1516944594,-5.518889395,1.6597985348,7.2057646117,4.2248294368,2.3996571918,9.6957253258 +050,3,5,37,013,North Carolina,Beaufort County,47759,47784,47826,47685,47442,47394,47349,47403,47407,47097,47127,47096,47073,42,-141,-243,-48,-45,54,4,-310,30,-31,-23,143,513,496,510,496,431,464,437,463,417,424,113,537,547,549,605,603,592,634,634,601,648,30,-24,-51,-39,-109,-172,-128,-197,-171,-184,-224,8,14,-4,-7,3,13,21,27,25,23,18,8,-128,-185,7,69,217,114,-136,176,130,184,16,-114,-189,0,72,230,135,-109,201,153,202,-4,-3,-3,-9,-8,-4,-3,-4,0,0,-1,503,503,506,512,512,515,522,515,516,510,512,512,10.742218174,10.428164454,10.755409338,10.470430533,9.0974332996,9.7879970467,9.2482857868,9.8276447614,8.851342029,9.0050865996,11.244778088,11.500415234,11.577881817,12.771392082,12.727963526,12.488134163,13.417421485,13.457293259,12.756970167,13.762490841,-0.502559915,-1.072250781,-0.822472479,-2.300961549,-3.630530226,-2.700137116,-4.169135698,-3.629648497,-3.905628138,-4.757404241,0.2931599502,-0.0840981,-0.147623265,0.0633292169,0.2744005404,0.4429912456,0.571404385,0.5306503651,0.4882035172,0.3822914122,-2.680319544,-3.889537145,0.1476232654,1.4565719895,4.5803782506,2.4048096192,-2.87818505,3.7357785702,2.7594111841,3.9078677696,-2.387159594,-3.973635246,0,1.5199012064,4.8547787909,2.8478008649,-2.306780665,4.2664289353,3.2476147013,4.2901591819 +050,3,5,37,015,North Carolina,Bertie County,21282,21273,21244,20855,20490,20325,20317,20167,19414,19246,19072,18962,18712,-29,-389,-365,-165,-8,-150,-753,-168,-174,-110,-250,49,196,192,181,170,165,178,171,186,173,165,33,266,226,259,246,269,244,236,251,268,280,16,-70,-34,-78,-76,-104,-66,-65,-65,-95,-115,0,1,5,6,16,35,12,13,7,12,8,-47,-321,-347,-90,51,-79,-705,-114,-115,-27,-142,-47,-320,-342,-84,67,-44,-693,-101,-108,-15,-134,2,1,11,-3,1,-2,6,-2,-1,0,-1,1324,1298,1315,1224,1317,1606,1642,1257,1319,1386,1468,1547,9.3113850685,9.2877010521,8.8692882519,8.365730033,8.1513684419,8.9942143958,8.8463528195,9.7082311185,9.0971236262,8.7593565854,12.636879736,10.932398113,12.691412471,12.105703459,13.289200672,12.329147823,12.209001552,13.100892531,14.092653941,14.86436269,-3.325494667,-1.644697061,-3.822124219,-3.739973427,-5.13783223,-3.334933428,-3.362648733,-3.392661412,-4.995530315,-6.105006105,0.0475070667,0.2418672149,0.2940095553,0.7873628266,1.7290781543,0.6063515323,0.6725297465,0.3653635367,0.6310143556,0.4246960769,-15.2497684,-16.78558471,-4.41014333,2.5097190099,-3.902776405,-35.62315252,-5.897568546,-6.00240096,-1.4197823,-7.538355364,-15.20226134,-16.5437175,-4.116133774,3.2970818365,-2.173698251,-35.01680099,-5.2250388,-5.637037424,-0.788767944,-7.113659288 +050,3,5,37,017,North Carolina,Bladen County,35190,35165,35178,34877,34805,34621,34365,34090,33657,33446,33169,32864,32911,13,-301,-72,-184,-256,-275,-433,-211,-277,-305,47,91,354,360,356,377,339,352,343,321,370,345,120,384,389,364,388,442,423,404,446,420,490,-29,-30,-29,-8,-11,-103,-71,-61,-125,-50,-145,7,26,11,-1,14,11,12,0,16,-4,2,36,-298,-53,-175,-262,-182,-374,-146,-167,-250,190,43,-272,-42,-176,-248,-171,-362,-146,-151,-254,192,-1,1,-1,0,3,-1,0,-4,-1,-1,0,511,511,509,518,478,326,320,318,322,289,300,296,10.106345015,10.332654057,10.255523867,10.929753863,9.9043167044,10.391604056,10.223089877,9.6374690385,11.206517953,10.490307868,10.962814931,11.165006745,10.485985078,11.248659148,12.913592871,12.487637829,12.041190409,13.390377543,12.720912271,14.899277841,-0.856469916,-0.832352688,-0.23046121,-0.318905285,-3.009276167,-2.096033773,-1.818100532,-3.752908504,-1.514394318,-4.408969973,0.7422739276,0.3157199851,-0.028807651,0.4058794538,0.3213790081,0.3542592292,0,0.4803722885,-0.121151545,0.0608133789,-8.507601171,-1.521196292,-5.04133898,-7.595744064,-5.317361771,-11.04107931,-4.351519306,-5.013885761,-7.57197159,5.7772709996,-7.765327243,-1.205476307,-5.070146631,-7.18986461,-4.995982762,-10.68682008,-4.351519306,-4.533513473,-7.693123135,5.8380843786 +050,3,5,37,019,North Carolina,Brunswick County,107431,107429,108070,110196,112039,114977,118382,122322,126422,130996,137071,142987,149039,641,2126,1843,2938,3405,3940,4100,4574,6075,5916,6052,252,1040,1013,1087,990,1114,999,986,967,1048,1035,242,1022,1203,1204,1234,1337,1367,1459,1551,1522,1821,10,18,-190,-117,-244,-223,-368,-473,-584,-474,-786,6,-12,33,8,1,22,3,14,0,-3,4,578,2107,1934,2968,3517,4070,4436,4994,6626,6404,6875,584,2095,1967,2976,3518,4092,4439,5008,6626,6401,6879,47,13,66,79,131,71,29,39,33,-11,-41,843,843,866,875,864,857,855,830,844,847,820,820,9.5296564742,9.1164758026,9.5764175212,8.4847809598,9.2561818665,8.0323545493,7.6606919485,7.2146142569,7.4841639946,7.0884099361,9.3647201122,10.826377483,10.607181873,10.575979499,11.109080032,10.991219889,11.335648634,11.571733932,10.869177099,12.471492264,0.1649363621,-1.709901681,-1.030764351,-2.09119854,-1.852898165,-2.958865339,-3.674956685,-4.357119675,-3.385013104,-5.383082328,-0.109957575,0.2969829235,0.0704796138,0.0085704858,0.1827971284,0.0241211848,0.1087725023,0,-0.021424134,0.027394821,19.306717492,17.404999213,26.147936709,30.142398622,33.817468758,35.667191972,38.800705467,49.435402343,45.733383799,47.084848609,19.196759917,17.701982136,26.218416323,30.150969108,34.000265887,35.691313157,38.90947797,49.435402343,45.711959665,47.11224343 +050,3,5,37,021,North Carolina,Buncombe County,238318,238315,238743,241226,243761,246952,249265,252160,255222,257408,259726,262049,263477,428,2483,2535,3191,2313,2895,3062,2186,2318,2323,1428,609,2567,2552,2650,2588,2643,2587,2476,2440,2503,2465,592,2366,2276,2448,2446,2586,2631,2691,2743,2664,2857,17,201,276,202,142,57,-44,-215,-303,-161,-392,47,97,92,174,145,229,245,231,196,165,142,355,2175,2123,2742,1983,2584,2846,2164,2414,2314,1676,402,2272,2215,2916,2128,2813,3091,2395,2610,2479,1818,9,10,44,73,43,25,15,6,11,5,2,7673,7675,7645,7712,7694,7778,7883,7672,7675,8018,8125,7955,10.696524151,10.523993427,10.80061054,10.430920343,10.541955427,10.197444923,9.6599886858,9.4366257102,9.5941737339,9.3810772445,9.8589700585,9.385818589,9.9773187179,9.8585900926,10.31460338,10.370884265,10.498800304,10.608468985,10.211297973,10.872915898,0.837554092,1.1381748377,0.8232918223,0.5723302507,0.2273520467,-0.173439342,-0.838811619,-1.171843275,-0.617124239,-1.491838653,0.4041927708,0.3793916126,0.7091721638,0.5844217348,0.9133968191,0.9657417882,0.9012348087,0.7580240325,0.6324565186,0.5404109407,9.0630853243,8.754873842,11.175575133,7.9924710359,10.306626116,11.218371956,8.4427364766,9.3360715018,8.8697235398,6.3783713841,9.467278095,9.1342654545,11.884747296,8.5768927707,11.220022935,12.184113745,9.3439712853,10.094095534,9.5021800585,6.9187823248 +050,3,5,37,023,North Carolina,Burke County,90912,90824,90567,90533,89965,89348,89292,89337,89444,90143,90309,90424,90418,-257,-34,-568,-617,-56,45,107,699,166,115,-6,232,808,879,861,854,895,895,918,865,909,863,298,994,984,1033,994,1045,1064,979,1070,1043,1133,-66,-186,-105,-172,-140,-150,-169,-61,-205,-134,-270,22,73,86,54,71,84,83,87,70,71,53,-219,82,-545,-493,35,124,197,675,303,179,208,-197,155,-459,-439,106,208,280,762,373,250,261,6,-3,-4,-6,-22,-13,-4,-2,-2,-1,3,3352,3352,3326,3252,3185,3256,3226,3153,3330,3368,3324,3114,8.923246825,9.7397201077,9.6033193355,9.5611285266,10.020769304,10.012249624,10.223457154,9.587036996,10.059037365,9.5442430409,10.977360574,10.903167902,11.521752466,11.128526646,11.700227847,11.902830838,10.902793632,11.859109348,11.541887757,12.530275047,-2.054113749,-1.163447794,-1.918433131,-1.567398119,-1.679458543,-1.890581214,-0.679336478,-2.272072352,-1.482850393,-2.986032006,0.8061844285,0.9529191459,0.6022987737,0.7948947604,0.9404967838,0.9285103003,0.9688897303,0.7758295835,0.7856893871,0.5861470234,0.9055770293,-6.038848076,-5.49876473,0.3918495298,1.3883523952,2.2038136044,7.5172479077,3.3582337685,1.9808225393,2.3003505823,1.7117614578,-5.08592893,-4.896465956,1.1867442902,2.328849179,3.1323239047,8.486137638,4.134063352,2.7665119264,2.8864976056 +050,3,5,37,025,North Carolina,Cabarrus County,178011,178116,178564,181187,184358,187265,191737,196483,201737,206987,211483,216340,221479,448,2623,3171,2907,4472,4746,5254,5250,4496,4857,5139,570,2327,2273,2251,2394,2337,2462,2568,2546,2545,2574,388,1386,1408,1488,1419,1553,1529,1582,1643,1613,1821,182,941,865,763,975,784,933,986,903,932,753,43,93,120,127,203,247,230,187,158,124,94,231,1586,2149,1998,3225,3681,4077,4064,3429,3809,4317,274,1679,2269,2125,3428,3928,4307,4251,3587,3933,4411,-8,3,37,19,69,34,14,13,6,-8,-25,1600,1626,1625,1627,1629,1594,1617,1562,1550,1564,1568,1567,12.93672568,12.436225362,12.114427794,12.633178717,12.039565195,12.365024358,12.565936916,12.168136306,11.897443569,11.758283674,7.7053295196,7.7035659084,8.0081157517,7.4880871341,8.0006182062,7.6791723168,7.7411651873,7.852414749,7.5405015626,8.3185060493,5.2313961601,4.7326594537,4.106312042,5.1450915826,4.0389469888,4.6858520416,4.8247717286,4.3157215571,4.3569420064,3.439777625,0.5170242751,0.6565539127,0.683488374,1.0712344526,1.2724743702,1.1551403747,0.915042914,0.7551317896,0.5796789794,0.4294011909,8.8172096811,11.757786319,10.752832844,17.01837985,18.963474319,20.476118728,19.886280228,16.388271561,17.806429294,19.720478097,9.3342339563,12.414340232,11.436321218,18.089614303,20.235948689,21.631259103,20.801323142,17.14340335,18.386108274,20.149879288 +050,3,5,37,027,North Carolina,Caldwell County,83029,83059,83025,82460,82094,82067,81698,81554,81829,81961,82116,82275,82100,-34,-565,-366,-27,-369,-144,275,132,155,159,-175,176,811,823,757,846,799,825,767,803,827,828,206,898,846,952,921,975,944,956,989,1020,1100,-30,-87,-23,-195,-75,-176,-119,-189,-186,-193,-272,4,8,21,49,49,68,73,62,57,55,51,4,-487,-358,135,-335,-24,327,266,286,298,42,8,-479,-337,184,-286,44,400,328,343,353,93,-12,1,-6,-16,-8,-12,-6,-7,-2,-1,4,968,968,967,940,966,975,963,952,940,944,969,935,9.8014925824,10.002795435,9.2226533708,10.331877996,9.7885477666,10.098969905,9.3656511387,9.7880873005,10.061378056,10.074524715,10.852947397,10.282338928,11.598369893,11.247824627,11.944723495,11.555669807,11.67348434,12.055315492,12.409438473,13.384030418,-1.051454815,-0.279543493,-2.375716522,-0.915946631,-2.156175728,-1.456699901,-2.307833201,-2.267228192,-2.348060417,-3.309505703,0.0966855002,0.2552353635,0.596974921,0.5984184655,0.833067895,0.8936058219,0.757066976,0.6947957361,0.6691363882,0.6205323194,-5.885729824,-4.351155244,1.6447268231,-4.091228284,-0.294023963,4.0028644351,3.2480615422,3.4861680796,3.6255026127,0.511026616,-5.789044324,-4.09591988,2.241701744,-3.492809819,0.5390439321,4.896470257,4.0051285182,4.1809638158,4.2946390009,1.1315589354 +050,3,5,37,029,North Carolina,Camden County,9980,9980,10011,10026,10006,10119,10280,10284,10385,10517,10613,10770,10984,31,15,-20,113,161,4,101,132,96,157,214,21,93,78,79,105,86,84,100,84,114,101,6,76,71,79,66,88,87,92,75,84,74,15,17,7,0,39,-2,-3,8,9,30,27,3,11,12,21,15,9,4,3,3,3,2,14,-13,-37,92,108,-4,100,124,84,123,186,17,-2,-25,113,123,5,104,127,87,126,188,-1,0,-2,0,-1,1,0,-3,0,1,-1,17,17,17,17,17,17,17,17,17,17,17,17,9.2828267705,7.7875399361,7.850931677,10.294622285,8.3641314919,8.1281145677,9.5684623481,7.9507808803,10.662675958,9.2856486163,7.585965963,7.088658147,7.850931677,6.4709054365,8.5586461778,8.4184043737,8.8029853603,7.0989115002,7.8567086003,6.803346511,1.6968608075,0.6988817891,0,3.8237168489,-0.194514686,-0.290289806,0.7654769878,0.85186938,2.8059673572,2.4823021054,1.0979687578,1.1980830671,2.0869565217,1.4706603265,0.8753160864,0.3870530747,0.2870538704,0.28395646,0.2805967357,0.18387423,-1.297599441,-3.694089457,9.1428571429,10.588754351,-0.389029372,9.6763268663,11.864893312,7.9507808803,11.504466165,17.100303392,-0.199630683,-2.49600639,11.229813665,12.059414677,0.4862867146,10.063379941,12.151947182,8.2347373403,11.7850629,17.284177623 +050,3,5,37,031,North Carolina,Carteret County,66469,66463,66700,67432,67792,68417,68670,68766,68875,69014,69547,69513,69558,237,732,360,625,253,96,109,139,533,-34,45,131,616,646,615,624,591,600,559,509,524,504,174,728,756,773,737,779,797,774,885,904,964,-43,-112,-110,-158,-113,-188,-197,-215,-376,-380,-460,31,60,152,91,64,95,53,29,7,19,20,234,782,325,684,308,198,257,331,902,326,489,265,842,477,775,372,293,310,360,909,345,509,15,2,-7,8,-6,-9,-4,-6,0,1,-4,987,987,977,966,981,984,985,974,999,984,975,975,9.1849819581,9.5545169497,9.0302402925,9.1037078643,8.6003667161,8.7183324736,8.1079709041,7.346944667,7.5363152596,7.2480962961,10.854978678,11.18144708,11.350204465,10.752295987,11.33618557,11.580851636,11.226421252,12.77415723,13.001582051,13.863422281,-1.66999672,-1.626930131,-2.319964173,-1.648588123,-2.735818854,-2.862519162,-3.118450348,-5.427212563,-5.465266791,-6.615325985,0.8946410998,2.2481216352,1.3361818969,0.9337136271,1.3824616549,0.7701193685,0.4206281864,0.1010385318,0.2732633396,0.2876228689,11.660155668,4.8068390227,10.043389203,4.4934968305,2.8813411333,3.7343524095,4.8009630935,13.019536522,4.6886236157,7.0323791445,12.554796767,7.0549606579,11.3795711,5.4272104576,4.2638027882,4.504471778,5.2215912799,13.120575054,4.9618869553,7.3200020134 +050,3,5,37,033,North Carolina,Caswell County,23719,23727,23745,23453,23044,23096,22808,22813,22749,22623,22691,22590,22443,18,-292,-409,52,-288,5,-64,-126,68,-101,-147,35,212,212,210,209,204,188,213,207,216,210,31,271,286,289,250,260,268,295,259,293,271,4,-59,-74,-79,-41,-56,-80,-82,-52,-77,-61,1,4,12,12,11,14,14,15,17,12,13,13,-238,-357,121,-265,50,4,-57,105,-37,-99,14,-234,-345,133,-254,64,18,-42,122,-25,-86,0,1,10,-2,7,-3,-2,-2,-2,1,0,1368,1368,1368,1289,1365,1269,1286,1365,1363,1341,1284,1190,8.9834315013,9.1188678839,9.1027308192,9.1059602649,8.9432498192,8.252491111,9.3890505157,9.1362492828,9.540425344,9.3264939045,11.483537438,12.301868938,12.527091461,10.892296968,11.398259573,11.764189456,13.003614564,11.431345721,12.941410305,12.035618324,-2.500105937,-3.183001054,-3.424360642,-1.786336703,-2.455009754,-3.511698345,-3.614564048,-2.295096438,-3.400984961,-2.70912442,0.1694987076,0.5161623331,0.5201560468,0.4792610666,0.6137524386,0.6145472104,0.6612007405,0.7503199894,0.5300236302,0.5773543846,-10.0851731,-15.35582941,5.2449068054,-11.54583479,2.1919729949,0.1755849173,-2.512562814,4.6343293463,-1.634239527,-4.396775698,-9.915674393,-14.83966708,5.7650628522,-11.06657372,2.8057254335,0.7901321277,-1.851362074,5.3846493357,-1.104215896,-3.819421313 +050,3,5,37,035,North Carolina,Catawba County,154358,154742,154758,154501,154739,155024,155157,155607,156517,157822,158521,159363,160307,16,-257,238,285,133,450,910,1305,699,842,944,440,1789,1816,1753,1712,1775,1721,1688,1646,1699,1688,307,1537,1543,1612,1557,1706,1638,1692,1779,1691,1819,133,252,273,141,155,69,83,-4,-133,8,-131,29,48,161,198,185,274,220,199,176,164,136,-137,-554,-175,-39,-180,128,614,1117,657,670,940,-108,-506,-14,159,5,402,834,1316,833,834,1076,-9,-3,-21,-15,-27,-21,-7,-7,-1,0,-1,2408,2408,2392,2332,2287,2385,2409,2542,2560,2586,2582,2544,11.569590537,11.744923037,11.318330466,11.038716104,11.423459603,11.027668491,10.739997264,10.406425936,10.689433882,10.560890919,9.9398885724,9.9793041004,10.407957051,10.039299635,10.979392722,10.495828581,10.765447495,11.247285383,10.639101056,11.380486126,1.629701965,1.7656189367,0.9103734145,0.9994164697,0.4440668803,0.5318399098,-0.02545023,-0.840859447,0.0503328258,-0.819595208,0.3104194219,1.0412624499,1.2783967097,1.1928519155,1.7633960176,1.4096961464,1.2661489666,1.1127162605,1.0318229291,0.8508774674,-3.582757495,-1.131807011,-0.251805413,-1.160612675,0.8237762418,3.9343337904,7.1069768626,4.1537192225,4.2153741616,5.8810648481,-3.272338073,-0.090544561,1.0265912972,0.032239241,2.5871722593,5.3440299368,8.3731258291,5.266435483,5.2471970908,6.7319423155 +050,3,5,37,037,North Carolina,Chatham County,63505,63486,63845,64120,64551,65276,66708,68307,69680,71248,73171,74419,75748,359,275,431,725,1432,1599,1373,1568,1923,1248,1329,159,671,609,595,624,646,649,609,678,643,629,110,597,630,631,645,651,638,724,711,758,845,49,74,-21,-36,-21,-5,11,-115,-33,-115,-216,9,7,27,12,-13,10,-9,-8,-6,-17,-13,287,197,429,744,1425,1576,1369,1685,1957,1383,1567,296,204,456,756,1412,1586,1360,1677,1951,1366,1554,14,-3,-4,5,41,18,2,6,5,-3,-9,778,779,772,764,777,779,779,783,776,762,764,764,10.487242605,9.4660024403,9.1660440432,9.455691599,9.569307114,9.4066832383,8.6427111717,9.3893462772,8.7133274612,8.3773398949,9.3306763568,9.7924163176,9.7206282206,9.7739119893,9.6433729586,9.2472479292,10.274750227,9.846349857,10.271698625,11.254137061,1.1565662486,-0.326413877,-0.554584177,-0.31822039,-0.074065845,0.1594353091,-1.632039055,-0.45700358,-1.558371163,-2.876797166,0.1094049154,0.419674985,0.1848613925,-0.196993575,0.1481316891,-0.130447071,-0.113533152,-0.08309156,-0.230367911,-0.17314057,3.078966905,6.6681692067,11.461406333,21.593526488,23.345554198,19.842448926,23.912920073,27.101697145,18.741107121,20.870097958,3.1883718204,7.0878441918,11.646267726,21.396532913,23.493685887,19.712001855,23.799386921,27.018605585,18.51073921,20.696957387 +050,3,5,37,039,North Carolina,Cherokee County,27444,27447,27435,27185,27044,27139,27093,27126,27860,28000,28425,28708,29073,-12,-250,-141,95,-46,33,734,140,425,283,365,57,234,207,221,222,197,253,236,232,259,248,98,347,353,372,382,362,354,390,399,349,379,-41,-113,-146,-151,-160,-165,-101,-154,-167,-90,-131,3,4,5,6,-12,-8,-3,6,13,-12,2,28,-139,6,237,126,207,835,288,577,386,497,31,-135,11,243,114,199,832,294,590,374,499,-2,-2,-6,3,0,-1,3,0,2,-1,-3,436,436,436,434,440,434,442,439,436,440,433,433,8.5682900037,7.6342916152,8.1575401879,8.1870482372,7.2668252826,9.2023424144,8.4496956677,8.2233052725,9.0665639823,8.5841366539,12.70596851,13.018864445,13.731244117,14.087623543,13.35325255,12.876004801,13.963480129,14.142667257,12.217107451,13.118499161,-4.137678506,-5.38457283,-5.573703929,-5.900575306,-6.086427267,-3.673662387,-5.513784461,-5.919361985,-3.150543469,-4.534362507,0.1464664958,0.1844031791,0.2214716793,-0.442543148,-0.295099504,-0.109118685,0.2148227712,0.4607886575,-0.420072462,0.0692269085,-5.089710729,0.2212838149,8.7481313327,4.6467030535,7.6356996625,30.371367257,10.311493018,20.451927337,13.512330877,17.202886762,-4.943244233,0.405686994,8.969603012,4.2041599056,7.3406001586,30.262248572,10.526315789,20.912715995,13.092258415,17.272113671 +050,3,5,37,041,North Carolina,Chowan County,14793,14793,14737,14805,14696,14669,14504,14251,14209,14015,14019,13917,13815,-56,68,-109,-27,-165,-253,-42,-194,4,-102,-102,39,139,158,169,129,161,145,116,124,141,126,62,198,156,184,177,180,193,208,194,181,216,-23,-59,2,-15,-48,-19,-48,-92,-70,-40,-90,1,17,23,-3,1,2,-4,-5,-5,-5,-2,-34,110,-134,-8,-119,-237,11,-96,80,-58,-9,-33,127,-111,-11,-118,-235,7,-101,75,-63,-11,0,0,0,-1,1,1,-1,-1,-1,1,-1,273,273,276,266,266,251,249,262,257,250,253,253,9.4103310541,10.711501305,11.510301379,8.843793919,11.198052513,10.189739986,8.2199546485,8.846400799,10.094501718,9.0869753354,13.404644235,10.575912681,12.531925762,12.134507935,12.519561815,13.562895292,14.739229025,13.840336734,12.958190149,15.577672003,-3.994313181,0.1355886241,-1.021624383,-3.290714016,-1.321509303,-3.373155306,-6.519274376,-4.993935935,-2.863688431,-6.490696668,1.150903798,1.5592691773,-0.204324877,0.068556542,0.1391062424,-0.281096275,-0.35430839,-0.35670971,-0.357961054,-0.144237704,7.4470245752,-9.084437816,-0.544866337,-8.158228499,-16.48408972,0.7730147576,-6.802721088,5.7073553542,-4.152348225,-0.649069667,8.5979283732,-7.525168638,-0.749191214,-8.089671957,-16.34498348,0.4919184821,-7.157029478,5.3506456446,-4.510309278,-0.793307371 +050,3,5,37,043,North Carolina,Clay County,10587,10591,10609,10684,10660,10606,10578,10644,10785,11033,11149,11277,11505,18,75,-24,-54,-28,66,141,248,116,128,228,22,77,88,82,83,69,99,93,84,86,84,16,118,142,148,154,131,143,151,174,133,144,6,-41,-54,-66,-71,-62,-44,-58,-90,-47,-60,2,-3,4,2,-2,1,3,0,-5,-1,-2,11,119,29,12,46,126,183,306,210,177,293,13,116,33,14,44,127,186,306,205,176,291,-1,0,-3,-2,-1,1,-1,0,1,-1,-3,91,91,97,92,92,100,120,110,113,112,116,117,7.2324238012,8.2458770615,7.7118404966,7.836102719,6.502685892,9.2398152037,8.5250710423,7.5737084122,7.669669134,7.3742428233,11.083454656,13.305847076,13.918931628,14.539274924,12.345679012,13.346399739,13.841782015,15.688395997,11.861232498,12.641559126,-3.851030855,-5.059970015,-6.207091131,-6.703172205,-5.84299312,-4.106584535,-5.316710973,-8.114687585,-4.191563364,-5.267316302,-0.281782746,0.3748125937,0.1880936706,-0.188821752,0.0942418245,0.2799944001,0,-0.450815977,-0.089182199,-0.17557721,11.177382238,2.7173913043,1.1285620239,4.3429003021,11.87446989,17.079658407,28.050233752,18.934271031,15.785249264,25.722061276,10.895599493,3.0922038981,1.3166556945,4.1540785498,11.968711714,17.359652807,28.050233752,18.483455054,15.696067065,25.546484066 +050,3,5,37,045,North Carolina,Cleveland County,98078,98034,97922,97452,97332,96893,97030,96881,97037,97198,97593,97964,99035,-112,-470,-120,-439,137,-149,156,161,395,371,1071,255,1112,1083,1081,1059,1041,1107,1044,1143,1127,1151,303,1065,1117,1129,1154,1235,1245,1217,1212,1285,1358,-48,47,-34,-48,-95,-194,-138,-173,-69,-158,-207,7,30,52,49,65,62,74,70,47,46,44,-64,-547,-124,-436,189,-5,227,271,422,482,1240,-57,-517,-72,-387,254,57,301,341,469,528,1284,-7,0,-14,-4,-22,-12,-7,-7,-5,1,-6,2050,2050,2036,2015,1990,2067,2089,1989,1942,1892,1945,1945,11.383295628,11.120009857,11.131419745,10.921860739,10.736884447,11.41719696,10.749864854,11.735655138,11.526051228,11.685338504,10.902167126,11.469114506,11.625691852,11.90163106,12.737802394,12.840478965,12.531212191,12.444106761,13.141948383,13.786872015,0.4811285023,-0.349104649,-0.494272107,-0.979770321,-2.000917947,-1.423282006,-1.781347337,-0.708451623,-1.615897155,-2.10153351,0.3071032993,0.5339247577,0.5045694427,0.6703691671,0.6394686222,0.7632091915,0.7207763791,0.4825684965,0.4704510705,0.4467027751,-5.599516824,-1.273205191,-4.489638306,1.9492272706,-0.05157005,2.3411957632,2.7904342678,4.3328490536,4.9295090434,12.58889639,-5.292413525,-0.739280434,-3.985068863,2.6195964378,0.587898572,3.1044049547,3.5112106469,4.8154175501,5.3999601139,13.035599165 +050,3,5,37,047,North Carolina,Columbus County,58098,58129,57997,57710,57546,57099,56906,56698,56324,56000,55764,55452,54754,-132,-287,-164,-447,-193,-208,-374,-324,-236,-312,-698,142,652,653,633,616,601,603,567,596,563,558,153,675,591,747,731,679,697,724,702,698,822,-11,-23,62,-114,-115,-78,-94,-157,-106,-135,-264,1,4,18,15,14,30,21,5,12,1,6,-121,-269,-240,-352,-85,-155,-299,-169,-140,-178,-438,-120,-265,-222,-337,-71,-125,-278,-164,-128,-177,-432,-1,1,-4,4,-7,-5,-2,-3,-2,0,-2,2925,2925,2904,2888,2836,2894,2960,2925,3093,3108,3084,2811,11.269845385,11.331297286,11.042784247,10.806543573,10.580613359,10.670488931,10.095794309,10.665330518,10.124442526,10.126490391,11.667401281,10.255431388,13.031532121,12.823998947,11.953804444,12.333881899,12.891278801,12.562184603,12.55215077,14.917518102,-0.397555895,1.0758658985,-1.988747874,-2.017455375,-1.373191085,-1.663392968,-2.795484491,-1.896854085,-2.427708243,-4.791027712,0.0691401557,0.3123481641,0.2616773518,0.245603263,0.5281504172,0.3716090673,0.0890281685,0.2147381983,0.017983024,0.1088869934,-4.649675473,-4.164642188,-6.140695189,-1.491162668,-2.728777156,-5.291005291,-3.009152096,-2.505278981,-3.200978277,-7.948750522,-4.580535318,-3.852294024,-5.879017838,-1.245559405,-2.200626738,-4.919396224,-2.920123927,-2.290540782,-3.182995252,-7.839863528 +050,3,5,37,049,North Carolina,Craven County,103505,103498,104180,104866,105381,104369,104168,102988,102784,102740,102663,102031,101233,682,686,515,-1012,-201,-1180,-204,-44,-77,-632,-798,410,1743,1631,1529,1502,1480,1439,1400,1386,1329,1304,194,1013,958,1009,980,1079,1129,1089,1145,1127,1146,216,730,673,520,522,401,310,311,241,202,158,143,177,713,441,288,401,191,86,-61,63,59,287,-219,-857,-2008,-1007,-1998,-699,-434,-247,-892,-1009,430,-42,-144,-1567,-719,-1597,-508,-348,-308,-829,-950,36,-2,-14,35,-4,16,-6,-7,-10,-5,-6,4939,5188,5114,5469,5332,5247,5159,5082,5437,5248,5029,4727,16.675755575,15.515084639,14.579261025,14.405117557,14.288748576,13.986353829,13.623713046,13.495421196,12.985236499,12.830604534,9.6916468146,9.1130907932,9.620977354,9.3988117217,10.417270077,10.973310266,10.597302505,11.148814769,11.011558717,11.275976071,6.9841087608,6.4019938453,4.958283671,5.0063058354,3.8714784993,3.0130435628,3.0264105409,2.3466064274,1.9736777824,1.5546284635,1.6934071927,6.7824986801,4.2050059595,2.7620997713,3.8714784993,1.8564236145,0.8368852299,-0.593954324,0.6155529718,0.5805258186,-2.095232628,-8.152316085,-19.1466031,-9.657758575,-19.28981058,-6.793927259,-4.223351044,-2.405028164,-8.715448425,-9.927975441,-0.401825436,-1.369817405,-14.94159714,-6.895658804,-15.41833208,-4.937503645,-3.386465814,-2.998982488,-8.099895454,-9.347449622 +050,3,5,37,051,North Carolina,Cumberland County,319431,319455,327247,330625,330161,333253,332680,331598,333723,331702,334495,336524,336364,7792,3378,-464,3092,-573,-1082,2125,-2021,2793,2029,-160,1375,5968,5651,5553,5915,5471,5459,5406,5545,5399,5379,512,2262,2285,2386,2385,2436,2551,2559,2586,2735,2912,863,3706,3366,3167,3530,3035,2908,2847,2959,2664,2467,472,604,3028,1922,1527,1788,1256,882,389,581,559,5596,-924,-7052,-1952,-5727,-5952,-2027,-5781,-545,-1228,-3184,6068,-320,-4024,-30,-4200,-4164,-771,-4899,-156,-647,-2625,861,-8,194,-45,97,47,-12,31,-10,12,-2,10157,17284,15494,15047,15286,14613,15880,16514,15285,16691,16304,16266,18.143347034,17.103873266,16.740677767,17.764549887,16.472019245,16.410123835,16.248262389,16.64672762,16.091943745,15.987801833,6.8767176594,6.9160060897,7.193095111,7.1628827525,7.3342787207,7.6684788245,7.691325093,7.7634693642,8.1517810971,8.6552293992,11.266629375,10.187867176,9.5475826558,10.601667135,9.1377405243,8.7416450105,8.5569372957,8.8832582554,7.9401626482,7.332572434,1.8362234599,9.1648430808,5.7942702445,4.5860469447,5.3832883221,3.7756210912,2.6509373709,1.1678227311,1.7316946316,1.6614949293,-2.809057081,-21.34427788,-5.884711507,-17.19992852,-17.92020811,-6.093299325,-17.37536161,-1.63615267,-3.660105004,-9.463684893,-0.972833621,-12.17943479,-0.090441263,-12.61388158,-12.53691978,-2.317678234,-14.72442424,-0.468329938,-1.928410373,-7.802189963 +050,3,5,37,053,North Carolina,Currituck County,23547,23547,23672,23909,24030,24260,24834,25128,25668,26330,27084,27916,29052,125,237,121,230,574,294,540,662,754,832,1136,66,216,233,242,253,261,260,256,249,271,271,29,201,230,234,213,226,224,218,244,192,205,37,15,3,8,40,35,36,38,5,79,66,3,4,0,4,7,0,4,2,9,-9,1,81,217,121,217,515,259,499,620,737,762,1075,84,221,121,221,522,259,503,622,746,753,1076,4,1,-3,1,12,0,1,2,3,0,-6,135,135,136,136,134,135,135,135,134,129,114,114,9.0792543242,9.720686706,10.022779043,10.306758463,10.447940435,10.237026538,9.8465325589,9.32339836,9.8545454545,9.5141131864,8.4487505517,9.5955276497,9.6914475047,8.6772314336,9.0468756255,8.8195920939,8.3849378822,9.1361815254,6.9818181818,7.19702289,0.6305037725,0.1251590563,0.3313315386,1.6295270298,1.4010648093,1.4174344437,1.4615946767,0.1872168345,2.8727272727,2.3170902963,0.1681343393,0,0.1656657693,0.2851672302,0,0.157492716,0.0769260356,0.3369903022,-0.327272727,0.0351074287,9.121287909,5.0480819375,8.9873679851,20.980160508,10.367879588,19.647216316,23.847071041,27.595761411,27.709090909,37.740485887,9.2894222484,5.0480819375,9.1530337544,21.265327739,10.367879588,19.804709032,23.923997077,27.932751713,27.381818182,37.775593316 +050,3,5,37,055,North Carolina,Dare County,33920,33920,33981,34161,34389,34823,34914,35499,35905,36257,36710,37071,37547,61,180,228,434,91,585,406,352,453,361,476,95,359,385,367,352,347,358,306,336,308,312,91,300,305,292,304,284,344,375,348,358,355,4,59,80,75,48,63,14,-69,-12,-50,-43,0,-13,12,14,20,65,66,57,47,50,43,57,132,139,339,29,453,324,365,417,360,479,57,119,151,353,49,518,390,422,464,410,522,0,2,-3,6,-6,4,2,-1,1,1,-3,152,152,152,131,134,151,144,142,150,150,159,159,10.53682017,11.232676878,10.605097382,10.095071483,9.8561345206,10.027449443,8.4809179346,9.2096427152,8.3490329489,8.3625934761,8.805142203,8.8986141503,8.4378431486,8.7184708261,8.0666922301,9.6353145482,10.393281783,9.5385585265,9.7043954406,9.5151303975,1.7316779666,2.3340627279,2.1672542334,1.3766006568,1.7894422905,0.3921348944,-1.912363848,-0.328915811,-1.355362492,-1.152536921,-0.381556162,0.3501094092,0.4045541236,0.573583607,1.8462499822,1.8486359308,1.579778831,1.2882535941,1.3553624917,1.1525369214,3.8742625693,4.0554339898,9.7959891348,0.8316962301,12.866942184,9.0751218419,10.116127602,11.429824441,9.7586099402,12.838725241,3.4927064072,4.405543399,10.200543258,1.4052798371,14.713192166,10.923757773,11.695906433,12.718078035,11.113972432,13.991262162 +050,3,5,37,057,North Carolina,Davidson County,162878,162824,162841,162934,163064,163337,163437,163548,164497,165489,166726,168238,169234,17,93,130,273,100,111,949,992,1237,1512,996,412,1728,1745,1681,1766,1704,1806,1771,1710,1786,1768,328,1586,1600,1740,1706,1788,1750,1841,1897,1858,2002,84,142,145,-59,60,-84,56,-70,-187,-72,-234,18,37,73,58,35,25,142,174,144,107,96,-68,-80,-62,305,33,195,762,894,1286,1477,1134,-50,-43,11,363,68,220,904,1068,1430,1584,1230,-17,-6,-26,-31,-28,-25,-11,-6,-6,0,0,1691,1691,1696,1695,1725,1765,1614,1609,1607,1579,1692,1580,10.608548845,10.705587151,10.300213541,10.80869347,10.422496445,11.01068451,10.733788706,10.294538176,10.663832531,10.477906315,9.736781521,9.8160111412,10.661732041,10.441467191,10.936281481,10.669267936,11.158049129,11.420315157,11.093729475,11.864688033,0.8717673241,0.8895760097,-0.3615185,0.3672262787,-0.513785036,0.3414165739,-0.424260423,-1.125776982,-0.429896944,-1.386781718,0.2271506408,0.4478555083,0.355391068,0.2142153292,0.1529122131,0.8657348839,1.0545901947,0.8669084779,0.6388746253,0.5689360895,-0.491136521,-0.380370432,1.8688668233,0.2019744533,1.1927152622,4.6457040955,5.4184116902,7.7419743239,8.818858146,6.7205575574,-0.26398588,0.0674850766,2.2242578914,0.4161897825,1.3456274753,5.5114389794,6.4730018849,8.6088828018,9.4577327713,7.2894936469 +050,3,5,37,059,North Carolina,Davie County,41240,41218,41252,41333,41285,41443,41262,41652,41927,42297,42504,42699,43286,34,81,-48,158,-181,390,275,370,207,195,587,76,370,402,389,391,358,408,383,388,402,401,106,399,401,430,419,463,504,487,463,472,490,-30,-29,1,-41,-28,-105,-96,-104,-75,-70,-89,4,9,18,22,3,10,0,-8,-9,-14,-11,62,102,-60,181,-159,485,374,483,292,280,692,66,111,-42,203,-156,495,374,475,283,266,681,-2,-1,-7,-4,3,0,-3,-1,-1,-1,-5,365,365,365,369,377,380,370,369,365,306,299,298,8.9604649755,9.7315355007,9.4043129291,9.4552929085,8.6354536025,9.7632180332,9.0947948328,9.1508354854,9.4362874547,9.327208234,9.6627716898,9.707327701,10.395513006,10.132398283,11.168198374,12.060445806,11.564399696,10.919682551,11.079422086,11.397336745,-0.702306714,0.0242077998,-0.991200077,-0.677105375,-2.532744772,-2.297227773,-2.469604863,-1.768847065,-1.643134631,-2.070128511,0.2179572562,0.4357403956,0.5318634561,0.0725470044,0.2412137878,0,-0.189969605,-0.212261648,-0.328626926,-0.25585858,2.4701822365,-1.452467985,4.3757857074,-3.844991234,11.698868707,8.9496165305,11.469414894,6.8867112416,6.5725385256,16.095830668,2.6881394926,-1.01672759,4.9076491635,-3.772444229,11.940082495,8.9496165305,11.279445289,6.6744495938,6.2439115994,15.839972088 +050,3,5,37,061,North Carolina,Duplin County,58505,58412,58663,59215,59449,59323,59426,58879,59284,58942,59001,58802,58794,251,552,234,-126,103,-547,405,-342,59,-199,-8,175,780,785,781,754,716,748,680,658,734,700,92,480,498,544,528,562,579,515,536,544,625,83,300,287,237,226,154,169,165,122,190,75,55,106,95,80,61,133,138,145,120,117,93,112,147,-144,-447,-179,-841,103,-653,-184,-505,-176,167,253,-49,-367,-118,-708,241,-508,-64,-388,-83,1,-1,-4,4,-5,7,-5,1,1,-1,0,679,679,679,680,486,360,362,362,375,360,363,363,13.234021616,13.230634396,13.151247769,12.699054308,12.104306665,12.660477476,11.503391809,11.157932221,12.461482305,11.905166842,8.1440133019,8.3934470438,9.160408177,8.8927064649,9.5008664046,9.8000220035,8.71212762,9.0891362777,9.2357580028,10.629613252,5.0900083137,4.8371873525,3.9908395918,3.8063478429,2.6034402603,2.8604554725,2.7912641889,2.0687959438,3.2257243024,1.2755535903,1.7984696042,1.6011595766,1.3471188496,1.0273770726,2.2484256794,2.3357565397,2.4529291357,2.0348812562,1.9863670704,1.5816864519,2.4941040737,-2.427020832,-7.527026572,-3.01476223,-14.21748869,1.7433545188,-11.04663949,-3.12015126,-8.573635646,-2.993299092,4.2925736779,-0.825861255,-6.179907722,-1.987385157,-11.96906302,4.0791110585,-8.593710351,-1.085270003,-6.587268576,-1.41161264 +050,3,5,37,063,North Carolina,Durham County,267587,269998,271366,276609,282757,288856,295324,301014,308105,312466,317478,322969,327306,1368,5243,6148,6099,6468,5690,7091,4361,5012,5491,4337,1108,4213,4323,4250,4345,4345,4297,4269,4127,4208,4188,359,1808,1691,1877,1824,1989,1926,2094,2034,2174,2429,749,2405,2632,2373,2521,2356,2371,2175,2093,2034,1759,294,1002,1367,1503,1423,1615,1825,1971,1545,1634,1271,284,1817,2075,2153,2446,1680,2868,221,1369,1823,1314,578,2819,3442,3656,3869,3295,4693,2192,2914,3457,2585,41,19,74,70,78,39,27,-6,5,0,-7,12508,12970,13376,13252,13103,13277,13342,14373,13904,14160,14783,14454,15.376613897,15.456785003,14.870200643,14.875552056,14.572272771,14.108901545,13.758296794,13.102751991,13.140821957,12.880704317,6.598841188,6.0461307981,6.567380378,6.2446506214,6.6707135886,6.3238874506,6.7486234452,6.4577168764,6.789008302,7.4706854792,8.7777727086,9.4106542049,8.3028202648,8.6309014345,7.9015591829,7.7850140941,7.0096733492,6.6450351142,6.3518136552,5.4100188382,3.6571011451,4.8876764051,5.2588027214,4.8717860933,5.4163913754,5.9922609539,6.3522143316,4.9051979224,5.1026860927,3.9091153743,6.6316894019,7.4191137824,7.5330687021,8.3741312609,5.6343885515,9.416879132,0.712247269,4.3464180943,5.6928988659,4.0413671139,10.288790547,12.306790187,12.791871423,13.245917354,11.050779927,15.409140086,7.0644616007,9.2516160167,10.795584959,7.9504824882 +050,3,5,37,065,North Carolina,Edgecombe County,56552,56511,56595,56038,55667,55419,54860,53734,53281,52793,52015,51429,50829,84,-557,-371,-248,-559,-1126,-453,-488,-778,-586,-600,204,645,686,629,650,608,595,606,610,587,572,104,566,587,617,580,673,651,636,708,758,730,100,79,99,12,70,-65,-56,-30,-98,-171,-158,-2,-5,9,10,-1,24,20,19,29,11,11,-6,-634,-498,-268,-634,-1101,-419,-477,-710,-426,-450,-8,-639,-489,-258,-635,-1077,-399,-458,-681,-415,-439,-8,3,19,-2,6,16,2,0,1,0,-3,1430,1441,1472,1281,1251,1256,881,894,911,915,913,912,11.453126526,12.282350835,11.32455935,11.788282447,11.197672063,11.119936458,11.425985633,11.640332799,11.349135764,11.187388762,10.050340486,10.509824985,11.108510523,10.518775107,12.394791609,12.166518712,11.991628486,13.510419052,14.655272418,14.277611532,1.4027860396,1.7725258493,0.216048827,1.2695073405,-1.197119546,-1.046582255,-0.565642853,-1.870086253,-3.306136654,-3.09022277,-0.088783927,0.1611387136,0.1800406892,-0.018135819,0.4420133709,0.3737793767,0.3582404736,0.5533928708,0.2126754573,0.2151420916,-11.25780189,-8.916342151,-4.82509047,-11.49810934,-20.27736339,-7.830677942,-8.993721364,-13.54858408,-8.236340435,-8.801267383,-11.34658581,-8.755203438,-4.645049781,-11.51624516,-19.83535002,-7.456898566,-8.635480891,-12.99519121,-8.023664978,-8.586125291 +050,3,5,37,067,North Carolina,Forsyth County,350670,350635,351378,354545,357644,360677,364555,367516,371437,375901,379196,382118,383843,743,3167,3099,3033,3878,2961,3921,4464,3295,2922,1725,1194,4644,4584,4587,4512,4407,4438,4387,4441,4357,4367,685,2997,3034,3162,3095,3288,3296,3435,3549,3520,3714,509,1647,1550,1425,1417,1119,1142,952,892,837,653,158,398,480,344,386,588,566,599,550,382,333,103,1129,1108,1292,2078,1287,2218,2910,1853,1698,716,261,1527,1588,1636,2464,1875,2784,3509,2403,2080,1049,-27,-7,-39,-28,-3,-33,-5,3,0,5,23,9851,9857,10082,9860,10091,10564,10600,10796,10821,10914,10876,10832,13.157242362,12.872987367,12.771448976,12.442914819,12.03981581,12.01158937,11.740337036,11.762727173,11.445999942,11.402669327,8.4910110593,8.5202102251,8.8038634538,8.5351997706,8.9827352811,8.9207297352,9.1926276999,9.4001168062,9.2471700245,9.6976216805,4.6662313028,4.352777142,3.9675855224,3.9077150484,3.0570805291,3.0908596352,2.5477093363,2.3626103666,2.1988299177,1.705047646,1.1276017356,1.3479567924,0.9577890664,1.0644869504,1.6064015649,1.5318971572,1.6030229963,1.4567664817,1.0035281106,0.8694959665,3.1986491445,3.1115335957,3.5972775403,5.7305800075,3.5160524048,6.0030881531,7.7876409336,4.90797871,4.460708722,1.8695468829,4.3262508801,4.4594903881,4.5550666067,6.7950669579,5.1224539696,7.5349853103,9.3906639298,6.3647451917,5.4642368326,2.7390428494 +050,3,5,37,069,North Carolina,Franklin County,60619,60564,60835,60945,61405,62078,62694,63667,64681,66175,67646,69775,71859,271,110,460,673,616,973,1014,1494,1471,2129,2084,173,681,647,665,670,703,713,697,692,746,752,96,461,522,562,528,586,556,575,674,661,714,77,220,125,103,142,117,157,122,18,85,38,8,5,27,32,36,92,87,82,116,64,60,178,-114,308,536,437,756,769,1286,1332,1983,1998,186,-109,335,568,473,848,856,1368,1448,2047,2058,8,-1,0,2,1,8,1,4,5,-3,-12,1640,1640,1641,1659,1665,1626,1623,1569,1529,1468,1503,1461,11.18410248,10.576215774,10.770713378,10.73958901,11.126850848,11.11041855,10.652931467,10.3421735,10.857147015,10.618919186,7.5710297257,8.5328974254,9.1024675461,8.4634373097,9.2750136514,8.6639448998,8.7882863606,10.073157427,9.6200726235,10.082324865,3.6130727541,2.043318349,1.6682458314,2.2761517007,1.8518371966,2.4464736498,1.8646451061,0.2690160737,1.2370743918,0.5365943206,0.0821152899,0.4413567634,0.518289967,0.5770525438,1.4561454879,1.3556892199,1.2532860549,1.7336591417,0.931444248,0.8472541904,-1.872228609,5.0347364119,8.6813569479,7.0047767127,11.96571727,11.983046093,19.655193495,19.907189455,28.860217871,28.21356454,-1.790113319,5.4760931753,9.199646915,7.5818292566,13.421862758,13.338735313,20.90847955,21.640848596,29.791662119,29.06081873 +050,3,5,37,071,North Carolina,Gaston County,206086,206100,206114,206894,207915,209242,210599,212998,216727,219788,222862,224652,226568,14,780,1021,1327,1357,2399,3729,3061,3074,1790,1916,624,2598,2572,2463,2408,2630,2522,2500,2612,2547,2561,548,2057,2122,2281,2166,2271,2287,2333,2388,2478,2646,76,541,450,182,242,359,235,167,224,69,-85,47,97,136,170,118,135,124,119,106,65,71,-90,150,477,995,1009,1896,3357,2767,2739,1653,1929,-43,247,613,1165,1127,2031,3481,2886,2845,1718,2000,-19,-8,-42,-20,-12,9,13,8,5,3,1,3317,3318,3308,3340,3289,3275,3320,3394,3409,3409,3337,3318,12.580870104,12.40088812,11.808503753,11.471009263,12.417462824,11.737739252,11.454360102,11.801649158,11.382884111,11.351447188,9.9610661295,10.231214848,10.935930597,10.318191887,10.722455541,10.644016522,10.689208847,10.78956286,11.07451387,11.728203537,2.6198039747,2.1696732713,0.8725731559,1.1528173761,1.6950072829,1.0937227297,0.7651512548,1.0120862984,0.3083702409,-0.376756349,0.4697245574,0.6557234776,0.8150408599,0.5621175636,0.6373982819,0.5771132701,0.5452275409,0.4789336948,0.2904937052,0.3147023625,0.7263781815,2.2998536676,4.7703862095,4.8065815392,8.9519047585,15.623945547,12.677685761,12.375465944,7.3874783806,8.5501529188,1.1961027389,2.9555771451,5.5854270694,5.3686991028,9.5893030404,16.201058817,13.222913302,12.854399639,7.6779720858,8.8648552812 +050,3,5,37,073,North Carolina,Gates County,12197,12185,12165,12043,11888,11700,11632,11530,11570,11502,11524,11536,11464,-20,-122,-155,-188,-68,-102,40,-68,22,12,-72,29,100,120,90,115,100,117,98,99,95,94,51,118,109,110,86,138,121,123,148,99,131,-22,-18,11,-20,29,-38,-4,-25,-49,-4,-37,0,0,3,7,8,8,1,1,1,1,1,4,-105,-171,-180,-106,-71,42,-42,69,18,-36,4,-105,-168,-173,-98,-63,43,-41,70,19,-35,-2,1,2,5,1,-1,1,-2,1,-3,0,61,61,61,58,60,60,61,60,60,60,61,61,8.261731659,10.028832895,7.630998813,9.8577061546,8.634832916,10.12987013,8.4951456311,8.5989750717,8.2393755421,8.1739130435,9.7488433576,9.1095232126,9.3267763269,7.37184982,11.916069424,10.476190476,10.662274619,12.85503344,8.5862966175,11.391304348,-1.487111699,0.919309682,-1.695777514,2.4858563346,-3.281236508,-0.346320346,-2.167128988,-4.256058369,-0.346921075,-3.217391304,0,0.2507208224,0.5935221299,0.6857534716,0.6907866333,0.0865800866,0.0866851595,0.0868583341,0.0867302689,0.0869565217,-8.674818242,-14.29108687,-15.26199763,-9.086233499,-6.13073137,3.6363636364,-3.640776699,5.9932250499,1.5611448395,-3.130434783,-8.674818242,-14.04036605,-14.6684755,-8.400480027,-5.439944737,3.7229437229,-3.55409154,6.080083384,1.6478751084,-3.043478261 +050,3,5,37,075,North Carolina,Graham County,8861,8858,8866,8809,8703,8713,8617,8587,8540,8529,8490,8470,8474,8,-57,-106,10,-96,-30,-47,-11,-39,-20,4,22,103,89,91,86,79,84,81,83,79,83,35,110,107,116,115,97,99,99,106,113,109,-13,-7,-18,-25,-29,-18,-15,-18,-23,-34,-26,0,1,0,-2,3,2,3,-1,4,-1,-1,21,-51,-88,37,-71,-14,-34,9,-19,13,32,21,-50,-88,35,-68,-12,-31,8,-15,12,31,0,0,0,0,1,0,-1,-1,-1,2,-1,93,93,93,93,93,93,96,96,94,94,93,93,11.654879774,10.164458657,10.450160772,9.9249855741,9.1839107184,9.8090733929,9.4908899174,9.7538045714,9.3160377358,9.7969782814,12.446958982,12.220191868,13.321084061,13.271783035,11.276447338,11.560693642,11.599976566,12.456666079,13.325471698,12.865911237,-0.792079208,-2.055733212,-2.870923289,-3.346797461,-2.092536619,-1.751620249,-2.109086648,-2.702861508,-4.009433962,-3.068932956,0.1131541726,0,-0.229673863,0.346220427,0.2325040688,0.3503240497,-0.11717148,0.4700628709,-0.117924528,-0.118035883,-5.770862801,-10.05025126,4.2489664676,-8.193883439,-1.627528482,-3.97033923,1.0545433242,-2.232798637,1.5330188679,3.7771482531,-5.657708628,-10.05025126,4.0192926045,-7.847663012,-1.395024413,-3.620015181,0.9373718437,-1.762735766,1.4150943396,3.6591123702 +050,3,5,37,077,North Carolina,Granville County,59916,57550,57683,57512,57573,57792,58027,58201,58719,59452,60100,60358,60486,133,-171,61,219,235,174,518,733,648,258,128,146,607,544,544,557,559,549,610,608,567,582,63,488,469,487,528,519,524,570,562,581,632,83,119,75,57,29,40,25,40,46,-14,-50,8,5,14,-11,-16,-9,28,22,39,5,16,42,-296,-19,177,233,150,465,668,566,267,162,50,-291,-5,166,217,141,493,690,605,272,178,0,1,-9,-4,-11,-7,0,3,-3,0,0,4561,4515,4440,4263,4253,4185,4113,4135,4105,3899,3708,3567,10.538651851,9.4538819134,9.4309365926,9.6184563845,9.6190246756,9.3910366062,10.324021968,10.17130621,9.4140696342,9.6322531528,8.4725899562,8.1504974584,8.442768604,9.1176749929,8.9307223733,8.9633937735,9.6470369211,9.4017665953,9.646515798,10.45976631,2.066061895,1.303384455,0.9881679886,0.5007813917,0.6883023024,0.4276428327,0.6769850471,0.7695396146,-0.232446164,-0.827513157,0.0868093233,0.2432984316,-0.190699086,-0.276293182,-0.154868018,0.4789599726,0.3723417759,0.6524357602,0.0830164871,0.2648042104,-5.139111941,-0.330190729,3.0685216487,4.0235194571,2.5811336339,7.9541566883,11.305650286,9.4686830835,4.4330804098,2.6811426302,-5.052302617,-0.086892297,2.8778225632,3.7472262755,2.4262656159,8.433116661,11.677992062,10.121118844,4.5160968968,2.9459468406 +050,3,5,37,079,North Carolina,Greene County,21362,21351,21257,21518,21198,21017,21016,20952,21087,20965,21041,20915,20928,-94,261,-320,-181,-1,-64,135,-122,76,-126,13,53,263,223,206,203,210,210,187,210,227,215,24,171,167,181,205,211,187,219,210,202,237,29,92,56,25,-2,-1,23,-32,0,25,-22,-4,-16,0,-6,-2,20,6,6,28,3,1,-131,182,-387,-202,4,-81,106,-95,48,-155,33,-135,166,-387,-208,2,-61,112,-89,76,-152,34,12,3,11,2,-1,-2,0,-1,0,1,1,2320,2197,2265,2213,2176,2353,2401,2561,2606,2595,2475,2485,12.296902396,10.441052533,9.759564136,9.6590773916,10.007624857,9.9907229002,8.8937505945,9.9985716326,10.820859949,10.27650981,7.9953243717,7.8190841839,8.5751510127,9.7542407156,10.055280213,8.8965008682,10.41567583,9.9985716326,9.6291352846,11.328059652,4.3015780245,2.6219683491,1.1844131233,-0.095163324,-0.047655356,1.0942220319,-1.521925235,0,1.1917246639,-1.051549841,-0.748100526,0,-0.28425915,-0.095163324,0.9531071292,0.2854492257,0.2853609816,1.3331428843,0.1430069597,0.04779772,8.5096434833,-18.11967413,-9.570058036,0.1903266481,-3.860083873,5.042936321,-4.518215543,2.2853878017,-7.388692916,1.5773247616,7.7615429573,-18.11967413,-9.854317186,0.0951633241,-2.906976744,5.3283855468,-4.232854561,3.6185306861,-7.245685957,1.6251224817 +050,3,5,37,081,North Carolina,Guilford County,488406,488455,489626,495022,500618,506537,512414,517281,524520,528622,533244,537872,540521,1171,5396,5596,5919,5877,4867,7239,4102,4622,4628,2649,1455,6056,6068,6211,6121,6176,6113,6248,6206,6049,6074,786,3862,3812,4049,3995,4315,4276,4536,4596,4721,5065,669,2194,2256,2162,2126,1861,1837,1712,1610,1328,1009,331,946,1413,1535,1645,1349,1564,1687,1272,1369,1087,223,2257,1977,2248,2169,1700,3829,735,1751,1926,520,554,3203,3390,3783,3814,3049,5393,2422,3023,3295,1607,-52,-1,-50,-26,-63,-43,9,-32,-11,5,33,15492,15512,15384,15696,15832,16378,17063,20066,19251,20255,20098,20099,12.300842535,12.189144671,12.333752004,12.014316685,11.99578516,11.735446597,11.865446445,11.688857163,11.294761725,11.264909917,7.8444276533,7.6573862038,8.040470434,7.8413976727,8.3811225654,8.2088613852,8.6142229633,8.6564594779,8.8151049933,9.3936069689,4.4564148813,4.5317584669,4.2932815704,4.1729190118,3.6146625943,3.5265852116,3.2512234817,3.0323976848,2.4796567319,1.871302948,1.9214988504,2.8383753164,3.0481901991,3.2288108064,2.6201933582,3.0024927985,3.2037465033,2.3957825187,2.556212399,2.0159626407,4.5843793924,3.9713149331,4.4640596532,4.2573195374,3.3019486353,7.3507320496,1.3958231653,3.2979679169,3.5962491458,0.9643979514,6.5058782428,6.8096902495,7.5122498523,7.4861303439,5.9221419935,10.353224848,4.5995696687,5.6937504356,6.1524615448,2.9803605921 +050,3,5,37,083,North Carolina,Halifax County,54691,54631,54476,54122,53739,53193,52840,52190,51814,51329,50696,50074,49479,-155,-354,-383,-546,-353,-650,-376,-485,-633,-622,-595,158,599,600,557,569,588,559,590,562,537,516,178,650,635,672,685,662,633,662,697,697,770,-20,-51,-35,-115,-116,-74,-74,-72,-135,-160,-254,6,15,16,5,16,19,15,19,12,15,14,-144,-319,-364,-439,-250,-599,-315,-433,-511,-476,-355,-138,-304,-348,-434,-234,-580,-300,-414,-499,-461,-341,3,1,0,3,-3,4,-2,1,1,-1,0,1416,1416,1437,1411,1408,1415,1311,1370,1402,1409,1385,1216,11.031510709,11.125429952,10.417835634,10.732507804,11.196800914,10.749586554,11.440427368,11.016907621,10.657933909,10.366337529,11.970754526,11.774413365,12.568735271,12.92050588,12.605922117,12.172608746,12.836547318,13.663317814,13.833482187,15.469147087,-0.939243817,-0.648983414,-2.150899637,-2.187998076,-1.409121203,-1.423022191,-1.39611995,-2.646410194,-3.175548278,-5.102809559,0.2762481814,0.296678132,0.0935173755,0.3017928381,0.3618013901,0.2884504442,0.3684205424,0.2352364617,0.2977076511,0.2812572198,-5.87487799,-6.749427504,-8.210825571,-4.715513095,-11.40626488,-6.057459328,-8.396110255,-10.01715266,-9.447256128,-7.131879501,-5.598629809,-6.452749372,-8.117308196,-4.413720257,-11.04446349,-5.769008884,-8.027689712,-9.781916197,-9.149548477,-6.850622282 +050,3,5,37,085,North Carolina,Harnett County,114678,114693,115757,119201,122250,125093,126769,128145,130822,132584,134649,136172,137058,1064,3444,3049,2843,1676,1376,2677,1762,2065,1523,886,430,1735,1777,1788,1975,1900,1842,1847,1863,1859,1850,248,782,837,915,952,974,985,956,1039,1122,1175,182,953,940,873,1023,926,857,891,824,737,675,67,72,437,287,280,330,228,160,123,47,71,759,2401,1627,1656,382,128,1585,708,1110,732,133,826,2473,2064,1943,662,458,1813,868,1233,779,204,56,18,45,27,-9,-8,7,3,8,7,7,3380,3380,3438,3381,3317,3302,3475,3453,3388,3301,3179,3134,14.768596941,14.719342641,14.457655968,15.683191589,14.906988239,14.225750771,14.023978193,13.94288879,13.72862518,13.541704791,6.6565088229,6.9330837313,7.398632668,7.5596953887,7.6417929184,7.6071468565,7.2587564444,7.7759857503,8.2859157894,8.6008125023,8.1120881179,7.7862589097,7.0590232996,8.1234962003,7.2651953208,6.6186039148,6.7652217489,6.1669030397,5.4427093911,4.9408922885,0.6128754926,3.6197820676,2.3206640172,2.2234398202,2.5891084836,1.760842115,1.2148546351,0.9205449926,0.3470927291,0.5197086704,20.437695248,13.476854517,13.390312238,3.0334071833,1.0042602603,12.240941896,5.3757317601,8.30735725,5.4057846327,0.9735387769,21.05057074,17.096636585,15.710976256,5.2568470035,3.593368744,14.001784011,6.5905863951,9.2279022426,5.7528773618,1.4932474472 +050,3,5,37,087,North Carolina,Haywood County,59036,59030,58930,58731,58666,59006,59192,59724,60493,61167,62170,62510,62972,-100,-199,-65,340,186,532,769,674,1003,340,462,130,529,579,550,544,610,578,636,590,522,531,196,653,702,718,712,784,758,825,811,842,850,-66,-124,-123,-168,-168,-174,-180,-189,-221,-320,-319,-1,-13,-4,-13,-11,7,22,15,16,5,6,-24,-60,73,517,366,695,924,844,1204,656,778,-25,-73,69,504,355,702,946,859,1220,661,784,-9,-2,-11,4,-1,4,3,4,4,-1,-3,813,813,815,629,674,657,672,681,681,682,688,688,8.9919344558,9.8639658594,9.3480182201,9.2048934838,10.259342729,9.6159445004,10.455367417,9.5672831348,8.3734359962,8.4633652635,11.099684687,11.959419747,12.203412876,12.047581177,13.185778196,12.610529293,13.56238698,13.150960377,13.506576837,13.547759838,-2.107750232,-2.095453887,-2.855394656,-2.842687694,-2.926435467,-2.994584793,-3.107019563,-3.583677242,-5.133140841,-5.084394575,-0.220973815,-0.068144842,-0.220953158,-0.186128361,0.1177301625,0.366004808,0.2465888542,0.259451746,0.0802053256,0.0956312459,-1.019879144,1.243643364,8.7871371269,6.1929981895,11.688923274,15.372201935,13.874732862,19.523743889,10.522938723,12.400184887,-1.240852959,1.1754985221,8.566183969,6.0068698286,11.806653436,15.738206743,14.121321716,19.783195635,10.603144049,12.495816133 +050,3,5,37,089,North Carolina,Henderson County,106740,106716,106894,107391,107811,108942,110338,111943,113711,115431,116557,117347,118445,178,497,420,1131,1396,1605,1768,1720,1126,790,1098,292,1076,1079,1022,1040,1135,1055,1071,1065,1069,1055,282,1270,1248,1336,1319,1424,1389,1448,1400,1431,1553,10,-194,-169,-314,-279,-289,-334,-377,-335,-362,-498,16,1,4,-13,30,25,28,8,25,-7,4,155,693,585,1427,1606,1847,2067,2082,1432,1163,1598,171,694,589,1414,1636,1872,2095,2090,1457,1156,1602,-3,-3,0,31,39,22,7,7,4,-4,-6,1299,1299,1303,1297,1297,1281,1293,1274,1268,1250,1208,1208,10.042700142,10.027787846,9.4300886262,9.485589201,10.212298847,9.3505987042,9.3479152665,9.1815093884,9.1405020863,8.9485648368,11.853372845,11.598405219,12.327395699,12.030280919,12.812611064,12.310883033,12.638451266,12.069589806,12.235789042,13.172626722,-1.810672702,-1.570617373,-2.897307073,-2.544691718,-2.600312217,-2.960284329,-3.290536,-2.888080418,-3.095286955,-4.224061885,0.0093333644,0.0371743757,-0.119952204,0.2736227654,0.2249405032,0.2481675485,0.0698256976,0.2155283894,-0.059853615,0.0339282079,6.4680215601,5.4367524465,13.167061125,14.647938709,16.618604379,18.320082959,18.172137801,12.345466145,9.9442506327,13.554319061,6.4773549245,5.4739268222,13.047108921,14.921561474,16.843544882,18.568250507,18.241963499,12.560994534,9.8843970176,13.588247269 +050,3,5,37,091,North Carolina,Hertford County,24669,24684,24773,24732,24619,24603,24615,24404,24211,23917,23882,23642,23108,89,-41,-113,-16,12,-211,-193,-294,-35,-240,-534,59,235,249,253,226,219,222,237,229,212,206,73,269,256,266,259,271,255,262,284,269,317,-14,-34,-7,-13,-33,-52,-33,-25,-55,-57,-111,13,42,34,38,35,38,13,15,11,13,11,81,-49,-136,-37,15,-197,-175,-286,12,-198,-429,94,-7,-102,1,50,-159,-162,-271,23,-185,-418,9,0,-4,-4,-5,0,2,2,-3,2,-5,2297,2431,2579,2598,2647,2801,2817,2602,2501,2690,2642,2453,9.493990506,10.090980933,10.279956117,9.1836320046,8.9353107979,9.132983647,9.8487367021,9.581790414,8.9218079286,8.8128342246,10.867589132,10.374663127,10.808175206,10.524604819,11.056937106,10.490589324,10.887632979,11.883093789,11.320595909,13.561497326,-1.373598626,-0.283682195,-0.528219089,-1.340972815,-2.121626308,-1.357605677,-1.038896277,-2.301303375,-2.398787981,-4.748663102,1.6967983032,1.3778849466,1.5440250295,1.4222438945,1.5504192252,0.5348143577,0.623337766,0.4602606749,0.5470919956,0.4705882353,-1.97959802,-5.511539786,-1.503392792,0.6095330976,-8.037699667,-7.199424046,-11.8849734,0.5021025544,-8.332631933,-18.35294118,-0.282799717,-4.13365484,0.0406322376,2.0317769922,-6.487280442,-6.664609688,-11.26163564,0.9623632294,-7.785539938,-17.88235294 +050,3,5,37,093,North Carolina,Hoke County,46952,46889,47498,49473,50499,51190,51633,52805,53086,54207,54661,55166,55830,609,1975,1026,691,443,1172,281,1121,454,505,664,221,985,960,912,901,951,980,922,839,856,846,78,312,298,291,295,312,324,351,393,342,422,143,673,662,621,606,639,656,571,446,514,424,47,51,271,188,152,218,138,80,60,23,38,377,1239,90,-124,-309,311,-511,465,-50,-32,201,424,1290,361,64,-157,529,-373,545,10,-9,239,42,12,3,6,-6,4,-2,5,-2,0,1,670,756,941,888,826,870,942,802,936,927,866,862,20.315352012,19.205377506,17.937043338,17.525261858,18.211762002,18.509599494,17.186582536,15.413160892,15.588152276,15.243792569,6.4349135308,5.9616692674,5.7233329072,5.7380158136,5.9748367452,6.1195002408,6.5428313124,7.2197523607,6.227976727,7.6038776172,13.880438482,13.243708238,12.213710431,11.787246044,12.236925257,12.390099253,10.643751223,8.1934085314,9.3601755488,7.6399149519,1.0518608656,5.421518025,3.6975484074,2.9565369616,4.1747256746,2.6064538063,1.491243604,1.1022522688,0.4188405401,0.6847093589,25.554031618,1.8005041412,-2.438808524,-6.010328428,5.9556866275,-9.651434022,8.667853448,-0.918543557,-0.582734665,3.6217521352,26.605892483,7.2220221662,1.2587398834,-3.053791467,10.130412302,-7.044980216,10.159097052,0.1837087115,-0.163894124,4.3064614941 +050,3,5,37,095,North Carolina,Hyde County,5810,5817,5812,5798,5689,5653,5599,5425,5434,5230,5006,4932,4843,-5,-14,-109,-36,-54,-174,9,-204,-224,-74,-89,19,44,60,48,49,42,46,35,37,30,34,21,52,64,54,53,61,74,69,57,52,56,-2,-8,-4,-6,-4,-19,-28,-34,-20,-22,-22,3,-2,7,9,0,-3,-2,-2,-2,-2,-2,-5,-5,-117,-38,-51,-153,39,-171,-203,-50,-63,-2,-7,-110,-29,-51,-156,37,-173,-205,-52,-65,-1,1,5,-1,1,1,0,3,1,0,-2,830,817,829,720,734,747,733,732,673,490,507,569,7.579672696,10.446591799,8.4641156762,8.7095627444,7.6197387518,8.4722350124,6.5641410353,7.2293864791,6.0374320789,6.9565217391,8.9577950043,11.143031253,9.5221301358,9.4205474582,11.066763425,13.629247629,12.940735184,11.137162954,10.46488227,11.457800512,-1.378122308,-0.696439453,-1.05801446,-0.710984714,-3.447024673,-5.157012616,-6.376594149,-3.907776475,-4.427450191,-4.501278772,-0.344530577,1.2187690433,1.5870216893,0,-0.544267054,-0.368358044,-0.375093773,-0.390777648,-0.402495472,-0.409207161,-0.861326443,-20.37085401,-6.700758244,-9.065055101,-27.75761974,7.1829818584,-32.07051763,-39.66393122,-10.0623868,-12.89002558,-1.20585702,-19.15208497,-5.113736554,-9.065055101,-28.30188679,6.8146238143,-32.4456114,-40.05470887,-10.46488227,-13.29923274 +050,3,5,37,097,North Carolina,Iredell County,159437,159465,159788,161077,162729,164661,166598,169592,172600,175673,178358,181866,185770,323,1289,1652,1932,1937,2994,3008,3073,2685,3508,3904,435,1812,1689,1769,1757,1877,1930,1883,1870,1892,1921,291,1393,1436,1465,1494,1490,1515,1628,1609,1610,1814,144,419,253,304,263,387,415,255,261,282,107,44,132,247,222,209,225,205,232,163,173,138,144,741,1152,1398,1466,2365,2387,2584,2267,3059,3680,188,873,1399,1620,1675,2590,2592,2816,2430,3232,3818,-9,-3,0,8,-1,17,1,2,-6,-6,-21,1292,1292,1289,1282,1277,1281,1249,1253,1240,1231,1170,1159,11.294469637,10.43217235,10.806683161,10.608013669,11.166304768,11.280216954,10.813356189,10.564046651,10.504574931,10.450554353,8.682779362,8.8695082858,8.9495708482,9.0201322832,8.8640352182,8.8546780755,9.3489877194,9.0895994983,8.9388824731,9.8684568432,2.6116902747,1.5626640643,1.8571123125,1.5878813859,2.30226955,2.4255388788,1.4643684696,1.4744471529,1.565692458,0.5820975095,0.8227759338,1.5256048375,1.3561807019,1.2618525082,1.3385288081,1.1981577594,1.3322881762,0.9208233177,0.9605134583,0.7507425823,4.6187649011,7.1153715496,8.5402730688,8.8510802725,14.069425028,13.951232057,14.838933825,12.806788106,16.983876699,20.019802196,5.4415408349,8.6409763871,9.8964537707,10.112932781,15.407953836,15.149389816,16.171222001,13.727611424,17.944390157,20.770544778 +050,3,5,37,099,North Carolina,Jackson County,40271,40273,40376,40256,40661,41034,40960,41352,42645,43220,43540,43736,44033,103,-120,405,373,-74,392,1293,575,320,196,297,107,435,366,388,367,385,396,397,388,353,365,55,329,328,375,328,349,393,409,407,387,405,52,106,38,13,39,36,3,-12,-19,-34,-40,16,61,72,30,55,109,50,32,66,5,17,37,-287,293,321,-158,247,1231,552,272,226,319,53,-226,365,351,-103,356,1281,584,338,231,336,-2,0,2,9,-10,0,9,3,1,-1,1,3574,3576,3422,3655,3673,3590,3674,4068,4017,4211,4205,4208,10.789760889,9.0463067093,9.4987453333,8.9518745274,9.3546505977,9.4289081753,9.2470738951,8.9442139235,8.0892799853,8.3172874249,8.1605317988,8.1070726794,9.180488402,8.0005854087,8.4799300224,9.3574770528,9.5265824259,9.3822037805,8.8684174343,9.2287709784,2.6292290902,0.9392340299,0.3182569313,0.9512891187,0.8747205754,0.0714311225,-0.279508531,-0.437989857,-0.779137449,-0.911483553,1.5130469293,1.7796013199,0.7344390722,1.3415615777,2.6484595199,1.190518709,0.7453560822,1.5214384509,0.1145790366,0.3873805102,-7.118761782,7.2419887045,7.8584980721,-3.853940532,6.0015550588,29.310570616,12.857392418,6.2701705855,5.1789724552,7.2690813385,-5.605714853,9.0215900243,8.5929371443,-2.512378955,8.6500145787,30.501089325,13.602748501,7.7916090364,5.2935514918,7.6564618487 +050,3,5,37,101,North Carolina,Johnston County,168878,168879,169676,172457,174387,177240,180732,185130,190937,196541,203031,209786,216246,797,2781,1930,2853,3492,4398,5807,5604,6490,6755,6460,570,2258,2247,2153,2282,2216,2325,2280,2356,2426,2481,302,1236,1197,1276,1227,1360,1454,1492,1478,1631,1794,268,1022,1050,877,1055,856,871,788,878,795,687,26,13,34,59,94,221,207,216,231,125,123,469,1738,847,1897,2297,3287,4707,4579,5365,5846,5680,495,1751,881,1956,2391,3508,4914,4795,5596,5971,5803,34,8,-1,20,46,34,22,21,16,-11,-30,1771,1771,1770,1761,1763,1767,1699,1695,1714,1745,1752,1387,13.199545206,12.95683362,12.245931058,12.749600527,12.113857137,12.364817971,11.768410077,11.792618101,11.753391939,11.647012431,7.225260352,6.9022384703,7.2576906779,6.8552847709,7.4344971601,7.7326646582,7.701082384,7.3979157699,7.9018063694,8.4219025801,5.9742848541,6.0545951494,4.9882403797,5.8943157565,4.6793599773,4.6321533131,4.0673276934,4.3947023315,3.8515855694,3.2251098509,0.0759938387,0.1960535572,0.3355828762,0.5251807404,1.2081057885,1.1008676645,1.1149020073,1.1562371738,0.6055952153,0.5774214144,10.15979166,4.8840400872,10.789842646,12.833405965,17.968523651,25.032773415,23.634890239,26.853733495,28.32247703,26.664663687,10.235785499,5.0800936444,11.125425522,13.358586705,19.17662944,26.13364108,24.749792246,28.009970669,28.928072245,27.242085102 +050,3,5,37,103,North Carolina,Jones County,10153,10163,10139,10056,10065,9996,9841,9770,9571,9550,9557,9339,9250,-24,-83,9,-69,-155,-71,-199,-21,7,-218,-89,21,110,99,90,98,113,76,96,100,87,84,53,146,123,120,131,126,113,128,140,104,126,-32,-36,-24,-30,-33,-13,-37,-32,-40,-17,-42,2,3,12,10,3,3,1,2,3,0,0,6,-50,21,-49,-126,-60,-163,10,43,-201,-47,8,-47,33,-39,-123,-57,-162,12,46,-201,-47,0,0,0,0,1,-1,0,-1,1,0,0,91,91,90,91,91,90,87,91,91,90,87,87,10.89378559,9.8404651856,8.9726334679,9.8805262893,11.524144613,7.8589524844,10.041315831,10.46736798,9.2082980525,9.0376028834,14.459024511,12.226032503,11.963511291,13.207642285,12.849931161,11.685021457,13.388421108,14.654315172,11.00762066,13.556404325,-3.565238921,-2.385567318,-2.990877823,-3.327115995,-1.325786548,-3.826068973,-3.347105277,-4.186947192,-1.799322608,-4.518801442,0.2971032434,1.1927836589,0.9969592742,0.3024650905,0.3059507419,0.1034072695,0.2091940798,0.3140210394,0,0,-4.951720723,2.087371403,-4.885100444,-12.7035338,-6.119014839,-16.85538493,1.045970399,4.5009682315,-21.27434378,-5.056753994,-4.65461748,3.2801550619,-3.888141169,-12.40106871,-5.813064097,-16.75197766,1.2551644788,4.8149892709,-21.27434378,-5.056753994 +050,3,5,37,105,North Carolina,Lee County,57866,57849,57879,58537,59257,59783,59425,59402,59653,60418,61219,61772,62353,30,658,720,526,-358,-23,251,765,801,553,581,225,841,811,781,796,778,744,769,813,780,791,89,549,510,546,522,604,578,598,626,615,624,136,292,301,235,274,174,166,171,187,165,167,12,17,58,37,89,86,92,104,82,69,65,-117,348,370,258,-722,-278,-4,489,531,318,346,-105,365,428,295,-633,-192,88,593,613,387,411,-1,1,-9,-4,1,-5,-3,1,1,1,3,999,994,1001,994,1021,1023,997,1043,1061,1035,1035,1029,14.448185816,13.769801518,13.121639785,13.354808402,13.094667037,12.498425098,12.809087956,13.367643069,12.683854916,12.745216516,9.431693238,8.6591846783,9.1733870968,8.7578014898,10.166039705,9.7097979925,9.9607732092,10.29292074,10.000731761,10.054380665,5.0164925783,5.1106168396,3.9482526882,4.5970069123,2.9286273322,2.7886271051,2.8483147471,3.0747223296,2.6831231554,2.690835851,0.2920560748,0.9847700222,0.6216397849,1.4931883766,1.4474824745,1.5455041787,1.7323083842,1.3482739627,1.1220333195,1.0473313192,5.9785596482,6.2821535902,4.3346774194,-12.11328099,-4.679071255,-0.067195834,8.145180768,8.7308960267,5.1711100812,5.5750251762,6.2706157229,7.2669236124,4.9563172043,-10.62009261,-3.23158878,1.4783083449,9.8774891523,10.079169989,6.2931434007,6.6223564955 +050,3,5,37,107,North Carolina,Lenoir County,59495,59511,59491,59425,59132,58754,58275,58012,57264,56644,56050,56074,55720,-20,-66,-293,-378,-479,-263,-748,-620,-594,24,-354,181,663,670,641,680,674,633,604,633,632,620,138,661,667,717,716,728,739,724,752,761,805,43,2,3,-76,-36,-54,-106,-120,-119,-129,-185,19,14,17,20,25,67,22,14,58,9,9,-79,-80,-311,-323,-467,-272,-668,-514,-536,146,-179,-60,-66,-294,-303,-442,-205,-646,-500,-478,155,-170,-3,-2,-2,1,-1,-4,4,0,3,-2,1,1242,1242,1242,1228,1185,1158,1184,1177,1152,1136,1111,1107,11.150728245,11.302580193,10.874913052,11.621051192,11.592009425,10.982338041,10.605049689,11.233960992,11.273233206,11.091829615,11.117091056,11.251971625,12.164294318,12.236283314,12.520746085,12.821402547,12.712013204,13.345874669,13.574257073,14.401488452,0.0336371893,0.050608568,-1.289381267,-0.615232122,-0.92873666,-1.839064506,-2.106963514,-2.111913678,-2.301023866,-3.309658837,0.2354603249,0.2867818855,0.3393108596,0.4272445291,1.1523214117,0.3816926333,0.24581241,1.0293360782,0.1605365488,0.1610104299,-1.345487571,-5.246421553,-5.479870383,-7.980927804,-4.678080955,-11.58957632,-9.024827053,-9.512485137,2.6042595698,-3.20231855,-1.110027246,-4.959639667,-5.140559524,-7.553683275,-3.525759543,-11.20788369,-8.779014643,-8.483149059,2.7647961186,-3.04130812 +050,3,5,37,109,North Carolina,Lincoln County,78265,78001,78127,78301,78743,79140,79479,80646,81235,82608,84334,86627,88097,126,174,442,397,339,1167,589,1373,1726,2293,1470,199,773,778,770,777,798,770,821,832,880,874,167,695,675,728,717,779,840,792,815,849,965,32,78,103,42,60,19,-70,29,17,31,-91,5,12,8,-12,2,68,41,57,74,26,31,91,86,339,371,292,1074,619,1285,1631,2241,1535,96,98,347,359,294,1142,660,1342,1705,2267,1566,-2,-2,-8,-4,-15,6,-1,2,4,-5,-5,679,679,677,697,704,718,686,690,706,707,712,675,9.8831411256,9.9080512468,9.754058385,9.7970608817,9.9672131148,9.5131609021,10.021789152,9.9675336344,10.294745585,10.004349717,8.8858772087,8.5963169558,9.2220188367,9.0405310839,9.7298985168,10.377993711,9.6677917274,9.7638700866,9.9320897749,11.045992537,0.9972639169,1.311734291,0.5320395483,0.7565297978,0.237314598,-0.864832809,0.3539974244,0.2036635478,0.3626558104,-1.04164282,0.153425218,0.101882275,-0.1520113,0.0252176599,0.8493364559,0.5065449312,0.695788041,0.8865354434,0.3041629377,0.3548453561,1.0995473956,4.3172614044,4.6996826764,3.6817783494,13.414519906,7.647592985,15.685747942,19.539720382,26.216505519,17.570568439,1.2529726136,4.4191436795,4.5476713769,3.7069960093,14.263856362,8.1541379161,16.381535983,20.426255825,26.520668457,17.925413795 +050,3,5,37,111,North Carolina,McDowell County,44996,45002,45102,45056,45005,45027,45017,44982,44876,45089,45481,45784,45782,100,-46,-51,22,-10,-35,-106,213,392,303,-2,127,461,441,445,482,462,480,429,460,414,423,57,489,500,524,519,525,504,554,511,544,554,70,-28,-59,-79,-37,-63,-24,-125,-51,-130,-131,1,-6,12,23,27,57,13,14,21,1,5,33,-10,8,83,11,-23,-93,325,422,433,124,34,-16,20,106,38,34,-80,339,443,434,129,-4,-2,-12,-5,-11,-6,-2,-1,0,-1,0,1666,1664,1648,1625,1660,1645,1509,1306,1491,1515,1545,1574,10.226491271,9.7933622767,9.8853740892,10.705877127,10.266780742,10.683522892,9.5370421831,10.157888926,9.072481236,9.2392372715,10.847623062,11.103585348,11.640305669,11.52769757,11.666796298,11.217699036,12.315900628,11.284089654,11.921328001,12.100561344,-0.621131791,-1.310223071,-1.75493158,-0.821820443,-1.400015556,-0.534176145,-2.778858445,-1.126200729,-2.848846765,-2.861324072,-0.133099669,0.2664860483,0.5109294473,0.59970681,1.2666807409,0.2893454116,0.3112321458,0.4637297118,0.0219142059,0.1092108425,-0.221832782,0.1776573656,1.8437888751,0.2443249967,-0.51111679,-2.06993256,7.2250319569,9.318758971,9.4888511478,2.7084288928,-0.354932452,0.4441434139,2.3547183224,0.8440318067,0.7555639507,-1.780587149,7.5362641027,9.7824886828,9.5107653536,2.8176397353 +050,3,5,37,113,North Carolina,Macon County,33922,33925,33959,33889,33816,33756,33849,34117,34299,34610,35226,35729,35994,34,-70,-73,-60,93,268,182,311,616,503,265,89,298,324,359,349,334,352,324,320,340,325,64,458,417,445,416,445,466,515,469,458,467,25,-160,-93,-86,-67,-111,-114,-191,-149,-118,-142,3,7,19,14,32,61,44,33,42,25,20,12,86,8,18,128,318,254,471,721,598,390,15,93,27,32,160,379,298,504,763,623,410,-6,-3,-7,-6,0,0,-2,-2,2,-2,-3,439,436,399,395,391,360,376,315,313,316,316,311,8.7843414692,9.5709327228,10.625702954,10.324680127,9.8284436336,10.289990645,9.4037063373,9.1643278538,9.5835388627,9.0626437823,13.500766419,12.318144893,13.171135973,12.306782043,13.094782685,13.622544434,14.947249271,13.431468011,12.909590586,13.022321989,-4.71642495,-2.74721217,-2.54543302,-1.982101916,-3.266339052,-3.332553789,-5.543542933,-4.267140157,-3.326051723,-3.959678206,0.2063435916,0.5612584004,0.4143728171,0.9466755417,1.7950151546,1.2862488307,0.9577849047,1.2028180308,0.7046719752,0.5577011558,2.5350784106,0.2363193265,0.5327650506,3.786702167,9.3576199865,7.4251637044,13.670202731,20.648376196,16.855753647,10.875172539,2.7414220021,0.7975777269,0.9471378678,4.7333777087,11.152635141,8.7114125351,14.627987636,21.851194226,17.560425622,11.432873695 +050,3,5,37,115,North Carolina,Madison County,20764,20803,20798,20872,20913,21178,21217,21175,21402,21603,21659,21638,21740,-5,74,41,265,39,-42,227,201,56,-21,102,38,180,180,209,176,214,215,194,189,202,197,68,230,187,238,225,239,246,259,269,273,275,-30,-50,-7,-29,-49,-25,-31,-65,-80,-71,-78,3,0,3,6,9,25,15,13,12,11,7,22,123,49,282,80,-42,244,252,124,39,174,25,123,52,288,89,-17,259,265,136,50,181,0,1,-4,6,-1,0,-1,1,0,0,-1,1028,1028,1097,1202,1285,1300,1233,1192,1148,1062,996,997,8.6393088553,8.6155318894,9.9308640802,8.302865904,10.096244574,10.099349414,9.0222067201,8.7374601267,9.3309005243,9.0829452718,11.039116871,8.9505803518,11.308830866,10.614459252,11.275712399,11.555534678,12.045111034,12.435855947,12.610573481,12.679238324,-2.399808015,-0.335048462,-1.377966786,-2.311593348,-1.179467824,-1.456185264,-3.022904313,-3.698395821,-3.279672957,-3.596293052,0,0.1435921982,0.2850965765,0.4245783701,1.1794678241,0.7046057731,0.6045808627,0.5547593731,0.5081183454,0.3227442482,5.9035277178,2.3453392366,13.399539094,3.7740299564,-1.981505945,11.461587242,11.719567492,5.7325135223,1.8015104973,8.0224998847,5.9035277178,2.4889314347,13.68463567,4.1986083265,-0.80203812,12.166193015,12.324148355,6.2872728954,2.3096288426,8.345244133 +050,3,5,37,117,North Carolina,Martin County,24505,24515,24505,24186,23851,23643,23441,23267,23121,22773,22696,22451,22178,-10,-319,-335,-208,-202,-174,-146,-348,-77,-245,-273,63,243,233,244,253,252,243,233,264,228,228,78,325,313,322,316,335,286,341,319,322,320,-15,-82,-80,-78,-63,-83,-43,-108,-55,-94,-92,3,1,1,-3,0,0,2,2,1,1,0,3,-238,-261,-126,-138,-90,-103,-242,-21,-152,-181,6,-237,-260,-129,-138,-90,-101,-240,-20,-151,-181,-1,0,5,-1,-1,-1,-2,0,-2,0,0,156,156,156,139,147,155,152,151,145,144,145,146,9.9813107145,9.7008555905,10.274982103,10.746750488,10.790442751,10.476847461,10.153832745,11.612307286,10.100338893,10.217571534,13.349489639,13.031621458,13.559607529,13.422818792,14.344437784,12.3307752,14.860330326,14.031537971,14.2645137,14.340451276,-3.368178924,-3.330765868,-3.284625426,-2.676068303,-3.553995033,-1.85392774,-4.706497581,-2.419230685,-4.164174807,-4.122879742,0.0410753527,0.0416345733,-0.126331747,0,0,0.0862291972,0.0871573626,0.0439860124,0.044299732,0,-9.775933951,-10.86662364,-5.305933381,-5.861863903,-3.853729554,-4.440803656,-10.54604088,-0.923706261,-6.733559262,-8.111317753,-9.734858598,-10.82498907,-5.432265128,-5.861863903,-3.853729554,-4.354574459,-10.45888351,-0.879720249,-6.68925953,-8.111317753 +050,3,5,37,119,North Carolina,Mecklenburg County,919628,919675,923292,944015,967418,991182,1010878,1034049,1058056,1079656,1095911,1113283,1128945,3617,20723,23403,23764,19696,23171,24007,21600,16255,17372,15662,3390,13728,13793,13852,14034,14592,14926,14856,14688,14571,14706,1124,5225,5128,5475,5647,5911,6049,6192,6227,6621,7302,2266,8503,8665,8377,8387,8681,8877,8664,8461,7950,7404,916,2840,4055,4567,4630,5051,5968,6580,4971,5375,4206,473,9319,10354,10567,6578,9330,9095,6295,2796,3995,4008,1389,12159,14409,15134,11208,14381,15063,12875,7767,9370,8214,-38,61,329,253,101,109,67,61,27,52,44,16113,16118,16551,16551,16678,16399,16742,17041,17495,17806,17307,17303,14.703527593,14.432104081,14.144797304,14.019559853,14.27141409,14.268882298,13.898972359,13.502686886,13.191236261,13.117310104,5.5962945568,5.3656078973,5.5907280711,5.6411895747,5.7811354635,5.7826925513,5.7931096425,5.7244846976,5.9940412657,6.5131645845,9.1072330367,9.0664961838,8.5540692331,8.3783702786,8.4902786261,8.4861897467,8.1058627168,7.7782021882,7.1971949951,6.6041455195,3.0418136921,4.2428900202,4.6635351782,4.6252360069,4.9400296441,5.7052585793,6.1561145748,4.5698431719,4.8660280627,3.7516256152,9.9812189426,10.833756663,10.790360462,6.5712316314,9.1250201107,8.6945922886,5.8894743539,2.5703644153,3.6167036485,3.5750155649,13.023032635,15.076646683,15.45389564,11.196467638,14.065049755,14.399850868,12.045588929,7.1402075873,8.4827317112,7.3266411801 +050,3,5,37,121,North Carolina,Mitchell County,15579,15581,15511,15354,15327,15278,15167,15062,15003,14992,14989,14928,14881,-70,-157,-27,-49,-111,-105,-59,-11,-3,-61,-47,32,135,153,137,135,146,153,139,142,129,135,68,224,190,220,186,227,242,210,240,228,245,-36,-89,-37,-83,-51,-81,-89,-71,-98,-99,-110,0,4,6,12,15,21,26,10,16,5,7,-34,-72,7,24,-75,-42,5,51,80,32,58,-34,-68,13,36,-60,-21,31,61,96,37,65,0,0,-3,-2,0,-3,-1,-1,-1,1,-2,204,204,209,203,202,202,204,205,197,188,187,187,8.7477725579,9.973599296,8.9527854926,8.8684513056,9.6595983989,10.17794778,9.2682113686,9.4726660218,8.6238593442,9.0576671475,14.514822615,12.385515466,14.376735827,12.218755132,15.018690661,16.098453351,14.002333722,16.010139755,15.242170004,16.437988527,-5.767050057,-2.41191617,-5.423950335,-3.350303827,-5.359092262,-5.920505571,-4.734122354,-6.537473733,-6.618310659,-7.380321379,0.259193261,0.391121541,0.7841855906,0.9853834784,1.3893942903,1.7295858972,0.6667777963,1.0673426503,0.3342581141,0.4696568151,-4.665478698,0.4563084645,1.5683711812,-4.926917392,-2.778788581,0.3326126725,3.4005667611,5.3367132517,2.1392519303,3.8914421819,-4.406285437,0.8474300055,2.3525567718,-3.941533914,-1.38939429,2.0621985698,4.0673445574,6.4040559021,2.4735100445,4.3610989969 +050,3,5,37,123,North Carolina,Montgomery County,27798,27782,27725,27700,27513,27439,27280,27432,27288,27274,27104,27209,27238,-57,-25,-187,-74,-159,152,-144,-14,-170,105,29,78,357,335,329,287,333,294,288,276,277,280,99,266,274,289,279,276,306,310,309,313,333,-21,91,61,40,8,57,-12,-22,-33,-36,-53,-1,-15,-10,-10,-13,1,3,-2,20,-8,-1,-35,-98,-243,-101,-151,97,-134,11,-157,150,83,-36,-113,-253,-111,-164,98,-131,9,-137,142,82,0,-3,5,-3,-3,-3,-1,-1,0,-1,0,1093,1093,1094,1061,1038,1050,1069,994,1062,936,969,1007,12.882273342,12.134823321,11.974086475,10.489957784,12.172832285,10.745614035,10.556797771,10.151164074,10.200136247,10.28523151,9.598556608,9.9251987757,10.518270491,10.19755478,10.089194327,11.184210526,11.363219823,11.364890213,11.525785723,12.232078902,3.2837167343,2.2096245449,1.4558159849,0.2924030044,2.0836379588,-0.438596491,-0.806422052,-1.213726139,-1.325649476,-1.946847393,-0.541271989,-0.362233532,-0.363953996,-0.475154882,0.0365550519,0.1096491228,-0.073311096,0.7355915995,-0.294588772,-0.03673297,-3.536310329,-8.802274827,-3.675935362,-5.519106709,3.5458400351,-4.897660819,0.403211026,-5.774394056,5.5235394841,3.0488364832,-4.077582318,-9.164508359,-4.039889358,-5.994261591,3.582395087,-4.788011696,0.3298999304,-5.038802457,5.2289507116,3.0121035135 +050,3,5,37,125,North Carolina,Moore County,88247,88250,88595,89265,90205,91391,92849,94057,95458,97376,98961,101167,103352,345,670,940,1186,1458,1208,1401,1918,1585,2206,2185,257,928,972,990,972,1059,1102,1132,1159,1125,1178,219,988,1005,1094,1053,1158,1065,1179,1148,1180,1266,38,-60,-33,-104,-81,-99,37,-47,11,-55,-88,21,-11,110,119,114,151,125,97,49,80,65,274,741,848,1154,1388,1151,1238,1863,1525,2187,2223,295,730,958,1273,1502,1302,1363,1960,1574,2267,2288,12,0,15,17,37,5,1,5,0,-6,-15,848,828,822,813,815,832,802,771,794,788,783,784,10.435173732,10.83189391,10.903323862,10.551454624,11.331899457,11.629686305,11.740668139,11.806231123,11.242804605,11.519712105,11.109861689,11.199643394,12.04872354,11.43074251,12.391255497,11.239215893,12.228134043,11.694178886,11.79245283,12.380267848,-0.674687957,-0.367749485,-1.145399678,-0.879287885,-1.05935604,0.3904704113,-0.487465903,0.1120522367,-0.549648225,-0.860555743,-0.123692792,1.2258316153,1.3106015551,1.2375162831,1.6157854751,1.319156795,1.0060466515,0.4991417817,0.7994883275,0.6356377647,8.3323962667,9.4500473617,12.709531047,15.067303517,12.316351535,13.064928897,19.322318678,15.534514636,21.856012152,21.738811553,8.2087034746,10.675878977,14.020132602,16.3048198,13.93213701,14.384085692,20.32836533,16.033656417,22.65550048,22.374449318 +050,3,5,37,127,North Carolina,Nash County,95840,95858,95819,95778,95225,94463,94253,93855,94060,94095,94161,94258,94859,-39,-41,-553,-762,-210,-398,205,35,66,97,601,262,1117,1103,1116,1103,1027,1035,1079,1071,1064,1061,271,1005,968,994,959,1001,1070,1097,1107,1137,1174,-9,112,135,122,144,26,-35,-18,-36,-73,-113,22,-2,19,47,50,57,84,73,51,58,45,-44,-147,-717,-953,-400,-474,162,-15,54,113,670,-22,-149,-698,-906,-350,-417,246,58,105,171,715,-8,-4,10,22,-4,-7,-6,-5,-3,-1,-1,2210,2216,2287,2209,1900,1925,1918,2044,2128,2209,2206,2203,11.659890291,11.549556813,11.766690566,11.689522881,10.919259149,11.015618764,11.469267359,11.378123406,11.293977784,11.220567162,10.490769688,10.135966451,10.480367762,10.163420166,10.642822209,11.388127611,11.660598974,11.760581336,12.06884656,12.415594579,1.1691206021,1.4135903625,1.2863228038,1.5261027152,0.2764369405,-0.372508847,-0.191331615,-0.38245793,-0.774868777,-1.195027417,-0.020877154,0.1989497547,0.4955505883,0.5298967761,0.6060348311,0.894021233,0.7759559937,0.5418154003,0.6156491649,0.475895874,-1.53447079,-7.507735481,-10.04807895,-4.239174209,-5.039658069,1.7241838065,-0.159443012,0.5736868944,1.1994544075,7.0855607904,-1.555347944,-7.308785726,-9.552528362,-3.709277433,-4.433623238,2.6182050395,0.6165129813,1.1155022947,1.8151035724,7.5614566644 +050,3,5,37,129,North Carolina,New Hanover County,202667,202683,203295,206006,209118,213033,216112,219619,224922,228863,232566,234275,236613,612,2711,3112,3915,3079,3507,5303,3941,3703,1709,2338,530,2232,2263,2199,2305,2281,2235,2265,2279,2128,2137,320,1694,1675,1740,1756,1933,1979,1908,1962,2098,2276,210,538,588,459,549,348,256,357,317,30,-139,46,150,259,206,148,200,137,142,100,105,82,346,2011,2214,3176,2319,2923,4872,3419,3271,1571,2391,392,2161,2473,3382,2467,3123,5009,3561,3371,1676,2473,10,12,51,74,63,36,38,23,15,3,4,6698,6698,6748,6621,6693,6797,6687,8486,8505,8470,8182,8179,10.906398958,10.902766402,10.418073154,10.742289902,10.469762307,10.055315483,9.9827010589,9.8780094012,9.1165943008,9.0764682897,8.2775268079,8.069877916,8.2434958107,8.1837141293,8.8724465324,8.9035657004,8.4092687065,8.5040168693,8.9880708849,9.6668422215,2.6288721503,2.8328884863,2.1745773432,2.5585757728,1.5973157751,1.1517497824,1.5734323523,1.3739925319,0.1285234159,-0.590373932,0.7329569192,1.2478199285,0.9759541017,0.6897435599,0.9179975719,0.6163660945,0.6258470421,0.4334361299,0.4498319556,0.3482781468,9.8265090972,10.666692362,15.046748675,10.807535914,13.416534513,21.919238046,15.068810119,14.17769581,6.7303428791,10.155281086,10.559466016,11.91451229,16.022702777,11.497279474,14.334532085,22.53560414,15.694657161,14.61113194,7.1801748347,10.503559233 +050,3,5,37,131,North Carolina,Northampton County,22099,22104,22037,21918,21287,20860,20658,20539,20135,19898,19741,19498,19088,-67,-119,-631,-427,-202,-119,-404,-237,-157,-243,-410,47,184,199,196,172,167,189,199,185,166,164,78,271,251,288,266,263,292,275,250,261,309,-31,-87,-52,-92,-94,-96,-103,-76,-65,-95,-145,-1,-3,4,9,17,25,12,11,7,9,6,-33,-28,-601,-352,-121,-46,-313,-170,-98,-156,-268,-34,-31,-597,-343,-104,-21,-301,-159,-91,-147,-262,-2,-1,18,8,-4,-2,0,-2,-1,-1,-3,752,752,817,686,633,749,741,703,745,770,727,441,8.3721988397,9.2118967712,9.3007806012,8.2855628884,8.1073864602,9.2934061071,9.9417980166,9.3342415298,8.4609699534,8.5004924066,12.330792856,11.619025576,13.666453128,12.813719351,12.767919994,14.358066578,13.738665601,12.613839905,13.303091312,16.016171668,-3.958594017,-2.407128805,-4.365672527,-4.528156462,-4.660533534,-5.064660471,-3.796867584,-3.279598375,-4.842121359,-7.515679262,-0.136503242,0.1851637542,0.4270766603,0.8189219134,1.2136806078,0.5900575306,0.549546624,0.3531875173,0.4587272866,0.3109936246,-1.274030258,-27.82085407,-16.70344271,-5.828797148,-2.233172318,-15.39066726,-8.492993281,-4.944625243,-7.951272968,-13.89104857,-1.4105335,-27.63569031,-16.27636605,-5.009875235,-1.019491711,-14.80060973,-7.943446657,-4.591437725,-7.492545682,-13.58005494 +050,3,5,37,133,North Carolina,Onslow County,177772,177801,186918,185068,190813,192522,192061,193402,192745,195332,197069,202795,203943,9117,-1850,5745,1709,-461,1341,-657,2587,1737,5726,1148,1037,4433,4189,4558,4253,4296,4211,3933,3920,3905,3802,158,862,924,898,982,1082,1127,1190,1260,1262,1269,879,3571,3265,3660,3271,3214,3084,2743,2660,2643,2533,519,271,3068,1456,829,1578,708,33,-604,27,48,6699,-5738,-595,-3438,-4660,-3457,-4462,-188,-311,3062,-1430,7218,-5467,2473,-1982,-3831,-1879,-3754,-155,-915,3089,-1382,1020,46,7,31,99,6,13,-1,-8,-6,-3,17805,25081,22606,22256,22737,20656,21120,20481,21381,20493,25405,25397,23.83423032,22.288969115,23.780766171,22.11746229,22.290077128,21.810346837,20.269173386,19.979561724,19.531640758,18.695081355,4.6345830219,4.916449621,4.6851970209,5.1068299951,5.6140278055,5.8371552802,6.1328035416,6.4220019827,6.3121461297,6.2398890686,19.199647299,17.372519494,19.09556915,17.010632295,16.676049323,15.973191557,14.136369844,13.557559741,13.219494628,12.455192286,1.4570440823,16.324315408,7.5964887109,4.3111629999,8.1875562635,3.6669972834,0.1700693419,-3.07848349,0.1350459156,0.2360241728,-30.85062341,-3.165895589,-17.93731332,-24.23404051,-17.93687072,-23.11036989,-0.968879887,-1.585113188,15.31520717,-7.031553482,-29.39357933,13.158419819,-10.34082461,-19.92287751,-9.749314461,-19.4433726,-0.798810545,-4.663596678,15.450253086,-6.795529309 +050,3,5,37,135,North Carolina,Orange County,133801,133692,133985,134853,137870,139471,140432,141449,142849,143624,148029,148192,149077,293,868,3017,1601,961,1017,1400,775,4405,163,885,312,1234,1276,1281,1159,1230,1157,1182,1169,1164,1127,239,750,716,722,766,774,786,862,804,836,925,73,484,560,559,393,456,371,320,365,328,202,183,465,685,760,711,617,586,642,438,515,392,47,-83,1736,297,-132,-53,448,-188,3576,-683,284,230,382,2421,1057,579,564,1034,454,4014,-168,676,-10,2,36,-15,-11,-3,-5,1,26,3,7,9557,9560,9264,9797,9482,9341,8989,9455,8232,10821,10475,10473,9.1802498159,9.3574799339,9.2377253994,8.2814403561,8.7270869622,8.1393467418,8.2520865841,8.0163756245,7.8589971677,7.5823580663,5.5795683646,5.2507489284,5.2065868371,5.4733246875,5.4916791128,5.5294092818,6.0180191501,5.5134011994,5.6444343919,6.2233196196,3.6006814513,4.1067310055,4.0311385623,2.8081156686,3.2354078494,2.60993746,2.2340674339,2.5029744251,2.2145627758,1.3590384467,3.459332386,5.0234120335,5.4806177233,5.0803314005,4.3777338664,4.1224349098,4.4820977893,3.0035693101,3.4771336266,2.6373419361,-0.617472232,12.730866117,2.1417677156,-0.943183889,-0.376045211,3.1516225932,-1.312514617,24.522291902,-4.611421878,1.910727321,2.8418601537,17.75427815,7.6223854389,4.1371475118,4.0016886559,7.274057503,3.1695831719,27.525861212,-1.134288251,4.5480692571 +050,3,5,37,137,North Carolina,Pamlico County,13144,13143,13108,13242,13016,12878,12870,12739,12771,12631,12600,12650,12715,-35,134,-226,-138,-8,-131,32,-140,-31,50,65,19,104,86,102,78,89,98,81,76,79,76,54,158,130,138,160,174,174,169,173,165,188,-35,-54,-44,-36,-82,-85,-76,-88,-97,-86,-112,1,-2,8,6,8,4,2,-2,-2,-2,-2,2,188,-192,-108,65,-50,107,-48,68,138,181,3,186,-184,-102,73,-46,109,-50,66,136,179,-3,2,2,0,1,0,-1,-2,0,0,-2,705,705,702,694,695,696,713,705,711,707,710,710,7.8937381404,6.5503846447,7.878272959,6.0587230076,6.9506814011,7.6832614661,6.3774505944,6.0243351433,6.2574257426,5.9925093633,11.992409867,9.9017442303,10.658839886,12.428149759,13.588972627,13.641709134,13.306038895,13.713289208,13.069306931,14.823575793,-4.098671727,-3.351359586,-2.780566927,-6.369426752,-6.638291226,-5.958447668,-6.9285883,-7.688954064,-6.811881188,-8.83106643,-0.151802657,0.6093381065,0.4634278211,0.621407488,0.3123901753,0.1568012544,-0.157467916,-0.158535135,-0.158415842,-0.157697615,14.269449715,-14.62411456,-8.34170078,5.0489358397,-3.904877192,8.3888671109,-3.779229982,5.3901946019,10.930693069,14.271634142,14.117647059,-14.01477645,-7.878272959,5.6703433276,-3.592487016,8.5456683653,-3.936697898,5.2316594665,10.772277228,14.113936527 +050,3,5,37,139,North Carolina,Pasquotank County,40661,40661,40632,40290,40411,39587,39479,39433,39418,39420,39693,39970,40372,-29,-342,121,-824,-108,-46,-15,2,273,277,402,135,519,463,486,523,516,490,474,467,474,455,121,424,396,440,386,408,431,422,449,409,408,14,95,67,46,137,108,59,52,18,65,47,32,43,118,92,81,85,38,68,86,4,25,-77,-483,-60,-985,-331,-243,-111,-116,169,206,330,-45,-440,58,-893,-250,-158,-73,-48,255,210,355,2,3,-4,23,5,4,-1,-2,0,2,0,3063,3003,2758,2704,2431,2271,2052,1940,1862,1951,2014,2031,12.827166901,11.474455087,12.150303758,13.229453874,13.077858881,12.428504394,12.02465816,11.805897893,11.900129295,11.326578875,10.47922691,9.8140047831,11.000275007,9.7639946374,10.340632603,10.932011008,10.705497349,11.350852578,10.268255024,10.156580618,2.3479399916,1.6604503042,1.1500287507,3.4654592366,2.7372262774,1.4964933863,1.3191608108,0.4550453149,1.6318742704,1.1699982574,1.0627517857,2.9243751626,2.3000575014,2.0489211545,2.154298459,0.9638431979,1.7250564449,2.1741053936,0.100423032,0.6223394986,-11.93742122,-1.486970422,-24.62561564,-8.372751878,-6.158759124,-2.81543671,-2.942743347,4.2723699013,5.1717861492,8.2148813821,-10.87466943,1.437404741,-22.32555814,-6.323830724,-4.004460665,-1.851593512,-1.217686902,6.4464752948,5.2722091812,8.8372208807 +050,3,5,37,141,North Carolina,Pender County,52217,52195,52415,53180,53730,54804,55931,57463,58829,60787,62121,63046,64671,220,765,550,1074,1127,1532,1366,1958,1334,925,1625,124,599,589,608,601,625,643,629,640,638,619,70,460,457,512,526,538,580,566,598,641,650,54,139,132,96,75,87,63,63,42,-3,-31,10,-7,15,26,24,10,22,25,22,12,15,147,631,396,936,1005,1416,1278,1861,1266,918,1654,157,624,411,962,1029,1426,1300,1886,1288,930,1669,9,2,7,16,23,19,3,9,4,-2,-13,1090,1090,1091,1089,1091,1093,1093,1100,1090,1064,1078,973,11.345234149,11.018613787,11.203862384,10.854743306,11.023510944,11.058370309,10.516987694,10.414293618,10.194380308,9.6933062944,8.7125337374,8.5492470302,9.4348314814,9.5001580349,9.4890382207,9.9748907921,9.4636169074,9.7308555993,10.242316265,10.17875459,2.632700412,2.4693667571,1.7690309028,1.3545852711,1.5344727234,1.0834795171,1.0533707865,0.6834380187,-0.047935958,-0.485448296,-0.132582035,0.2806098588,0.4791125362,0.4334672868,0.1763761751,0.3783579266,0.4180042804,0.3579913431,0.1917438302,0.2348943367,11.951323453,7.4081002713,17.248051302,18.151442633,24.974866395,21.979155918,31.11623863,20.600774563,14.668403014,25.901015527,11.818741418,7.68871013,17.727163838,18.58490992,25.15124257,22.357513844,31.534242911,20.958765906,14.860146844,26.135909863 +050,3,5,37,143,North Carolina,Perquimans County,13453,13452,13480,13499,13590,13638,13541,13474,13425,13464,13427,13578,13667,28,19,91,48,-97,-67,-49,39,-37,151,89,36,134,120,138,141,111,123,126,125,112,119,49,139,137,161,168,146,178,160,186,132,148,-13,-5,-17,-23,-27,-35,-55,-34,-61,-20,-29,0,2,4,5,-2,-3,-3,-3,-3,-3,-3,39,22,104,68,-67,-26,10,76,29,176,122,39,24,108,73,-69,-29,7,73,26,173,119,2,0,0,-2,-1,-3,-1,0,-2,-2,-1,84,84,86,84,74,84,80,81,75,72,72,72,9.9336520998,8.8596847429,10.136624063,10.375657677,8.2176568573,9.1453213874,9.3718620997,9.2967907478,8.2947602296,8.7355478069,10.30431076,10.114806748,11.826061407,12.362485743,10.80880992,13.23469274,11.90077727,13.833624633,9.7759674134,10.864378785,-0.37065866,-1.255122005,-1.689437344,-1.986828066,-2.591153063,-4.089371352,-2.52891517,-4.536833885,-1.481207184,-2.128830978,0.1482634642,0.2953228248,0.3672689878,-0.147172449,-0.222098834,-0.223056619,-0.223139574,-0.223122978,-0.222181078,-0.220223894,1.6308981059,7.6783934438,4.9948582342,-4.930277052,-1.924856561,0.743522064,5.652869203,2.1568554535,13.034623218,8.9557717012,1.7791615701,7.9737162686,5.362127222,-5.077449501,-2.146955395,0.5204654448,5.4297296292,1.9337324755,12.81244214,8.7355478069 +050,3,5,37,145,North Carolina,Person County,39464,39479,39412,39525,39188,39253,39130,39214,39315,39412,39533,39621,39925,-67,113,-337,65,-123,84,101,97,121,88,304,101,427,381,407,438,410,407,416,426,416,414,137,442,391,401,417,445,430,450,466,462,492,-36,-15,-10,6,21,-35,-23,-34,-40,-46,-78,1,-9,-3,-3,-6,2,8,11,6,10,10,-30,137,-324,68,-132,121,119,122,156,124,372,-29,128,-327,65,-138,123,127,133,162,134,382,-2,0,0,-6,-6,-4,-3,-2,-1,0,0,442,442,443,442,442,443,448,452,450,448,444,444,10.818754196,9.6807388868,10.377226195,11.175892732,10.466659859,10.365597423,10.568165941,10.79232377,10.511155469,10.409071481,11.19880411,9.9348265217,10.224244974,10.640062258,11.360155213,10.951368284,11.431910272,11.805687504,11.673446699,12.37020089,-0.380049913,-0.254087635,0.1529812216,0.5358304734,-0.893495354,-0.585770862,-0.863744332,-1.013363734,-1.16229123,-1.961129409,-0.228029948,-0.07622629,-0.076490611,-0.153094421,0.0510568774,0.2037463867,0.2794466955,0.1520045601,0.2526720065,0.2514268474,3.4711225408,-8.232439368,1.7337871776,-3.368077262,3.0889410804,3.0307275019,3.099317896,3.9521185636,3.1331328802,9.3530787217,3.2430925928,-8.308665659,1.6572965668,-3.521171683,3.1399979577,3.2344738886,3.3787645916,4.1041231237,3.3858048867,9.6045055691 +050,3,5,37,147,North Carolina,Pitt County,168148,168173,168865,170813,173021,174443,175052,176178,177291,178661,179673,181257,182924,692,1948,2208,1422,609,1126,1113,1370,1012,1584,1667,547,2094,2158,2125,2136,2133,2115,2017,2060,2110,2062,215,1142,1185,1195,1173,1257,1259,1312,1310,1371,1548,332,952,973,930,963,876,856,705,750,739,514,49,151,207,212,179,187,126,134,127,92,75,295,842,1020,297,-514,84,135,533,137,745,1068,344,993,1227,509,-335,271,261,667,264,837,1143,16,3,8,-17,-19,-21,-4,-2,-2,8,10,6526,6528,6248,6665,6745,6462,6798,6572,6713,6325,6610,6612,12.329323654,12.552568972,12.231482974,12.223350835,12.14588731,11.967103197,11.332988718,11.497653028,11.692017843,11.32403942,6.7240150967,6.8928610899,6.8784104253,6.7125423826,7.1577029297,7.1236798701,7.3717804648,7.311614304,7.5970409775,8.501267227,5.6053085569,5.6597078823,5.3530725485,5.5108084522,4.9881843806,4.8434233271,3.9612082528,4.1860387236,4.0949768653,2.8227721929,0.8890773026,1.2040694056,1.2202703014,1.0243351121,1.0648293141,0.7129338075,0.7529105048,0.7088358905,0.5097941429,0.4118831021,4.9576363497,5.9330956217,1.7095296203,-2.941386858,0.4783190502,0.7638576509,2.9947858138,0.7646497402,4.1282243094,5.8652153737,5.8467136523,7.1371650273,2.9297999217,-1.917051746,1.5431483643,1.4767914584,3.7476963186,1.4734856307,4.6380184523,6.2770984758 +050,3,5,37,149,North Carolina,Polk County,20510,20514,20474,20289,20251,20390,20372,20417,20418,20567,20673,20723,21030,-40,-185,-38,139,-18,45,1,149,106,50,307,39,116,135,130,150,152,140,149,166,150,153,54,285,260,278,280,301,282,295,322,273,296,-15,-169,-125,-148,-130,-149,-142,-146,-156,-123,-143,0,-3,-2,0,1,19,14,16,17,14,8,-24,-11,93,286,113,177,130,279,246,160,446,-24,-14,91,286,114,196,144,295,263,174,454,-1,-2,-4,1,-2,-2,-1,0,-1,-1,-4,330,330,343,352,353,351,353,345,339,344,339,339,5.691435861,6.6600888012,6.397480377,7.3597958883,7.4529897767,6.8568629852,7.2709527876,8.0504364694,7.2470770123,7.3288146959,13.983269141,12.826837691,13.680765729,13.738285658,14.758881071,13.811681156,14.395510553,15.615906887,13.189680162,14.178621895,-8.29183328,-6.16674889,-7.283285352,-6.37848977,-7.305891294,-6.954818171,-7.124557765,-7.565470417,-5.94260315,-6.849807199,-0.147192307,-0.098667982,0,0.0490653059,0.9316237221,0.6856862985,0.7807734537,0.824442289,0.6763938545,0.3832059972,-0.539705125,4.5880611741,14.074456829,5.5443795692,8.6788104636,6.3670870577,13.614737099,11.930164888,7.7302154798,21.363734342,-0.686897431,4.4893931919,14.074456829,5.5934448751,9.6104341857,7.0527733562,14.395510553,12.754607177,8.4066093342,21.74694034 +050,3,5,37,151,North Carolina,Randolph County,141752,141825,141985,141861,142274,142313,142467,142560,143070,143000,143176,143495,144557,160,-124,413,39,154,93,510,-70,176,319,1062,398,1610,1611,1621,1545,1619,1586,1595,1532,1539,1531,312,1294,1312,1446,1371,1488,1518,1593,1591,1603,1720,86,316,299,175,174,131,68,2,-59,-64,-189,2,5,26,53,26,72,67,37,98,18,2,86,-443,116,-168,-15,-92,383,-102,143,364,1251,88,-438,142,-115,11,-20,450,-65,241,382,1253,-14,-2,-28,-21,-31,-18,-8,-7,-6,1,-2,1298,1298,1294,1294,1294,1276,1281,1294,1261,1257,1218,1218,11.34417959,11.339680082,11.391946927,10.850481073,11.360327267,11.105276056,11.15111686,10.706697976,10.737046998,10.630025134,9.117620118,9.2350467207,10.162094544,9.6284851464,10.441116105,10.629135595,11.137134268,11.119031645,11.183551877,11.942288198,2.2265594724,2.1046333609,1.2298523826,1.2219959267,0.9192111625,0.4761404614,0.0139825917,-0.412333669,-0.446504878,-1.312263064,0.0352303714,0.1830115966,0.3724695787,0.1825970925,0.5052152954,0.4691383958,0.258677946,0.6848932126,0.1255794971,0.0138863816,-3.121410906,0.8165132771,-1.180658287,-0.105344476,-0.645552877,2.6817911284,-0.713112175,0.9993849938,2.539496496,8.6859317068,-3.086180535,0.9995248737,-0.808188709,0.0772526161,-0.140337582,3.1509295242,-0.454434229,1.6842782064,2.665075993,8.6998180884 +050,3,5,37,153,North Carolina,Richmond County,46639,46647,46636,46654,46364,46134,45770,45427,45034,44786,44881,44764,44332,-11,18,-290,-230,-364,-343,-393,-248,95,-117,-432,150,610,554,504,532,525,557,538,559,563,552,141,553,527,511,529,575,585,567,572,562,621,9,57,27,-7,3,-50,-28,-29,-13,1,-69,5,-14,8,-4,8,23,9,-3,4,-6,-5,-20,-24,-330,-216,-376,-315,-374,-215,108,-113,-358,-15,-38,-322,-220,-368,-292,-365,-218,112,-119,-363,-5,-1,5,-3,1,-1,0,-1,-4,1,0,1160,1147,1172,1097,1047,1095,1100,1138,1150,1105,1029,866,13.077500268,11.91167301,10.89753292,11.57729805,11.513536629,12.314699152,11.979514585,12.468355136,12.560655921,12.39112867,11.855504341,11.331140209,11.048887544,11.512012535,12.610063928,12.933750456,12.625250501,12.758316884,12.538345697,13.940019754,1.2219959267,0.5805328001,-0.151354624,0.0652855153,-1.096527298,-0.619051304,-0.645735916,-0.289961747,0.0223102237,-1.548891084,-0.30013935,0.1720097185,-0.086488357,0.1740947075,0.5044025571,0.1989807762,-0.066800267,0.0892189992,-0.133861342,-0.112238484,-0.514524601,-7.09540089,-4.670371251,-8.182451253,-6.908121978,-8.268756702,-4.787352483,2.408912978,-2.521055274,-8.036275478,-0.814663951,-6.923391172,-4.756859608,-8.008356546,-6.403719421,-8.069775926,-4.85415275,2.4981319772,-2.654916616,-8.148513962 +050,3,5,37,155,North Carolina,Robeson County,134168,134205,134469,135168,135458,135135,134920,134446,133344,132606,131890,130440,129999,264,699,290,-323,-215,-474,-1102,-738,-716,-1450,-441,504,1998,1806,1936,1885,1782,1753,1813,1708,1735,1661,259,1204,1226,1251,1272,1351,1399,1414,1435,1507,1525,245,794,580,685,613,431,354,399,273,228,136,10,21,59,44,47,70,69,58,77,32,35,24,-113,-329,-1056,-873,-975,-1527,-1196,-1066,-1709,-617,34,-92,-270,-1012,-826,-905,-1458,-1138,-989,-1677,-582,-15,-3,-20,4,-2,0,2,1,0,-1,5,4105,4105,4098,4207,4294,4150,4260,4193,4308,4351,4278,4253,14.819924565,13.346832899,14.309313249,13.960119235,13.231068509,13.092348482,13.634141756,12.915129151,13.227614074,12.755386098,8.9305251134,9.0604746033,9.2463589228,9.4203032716,10.030961591,10.448485754,10.63357774,10.850825721,11.489345481,11.710995665,5.8893994519,4.2863582952,5.0629543262,4.5398159634,3.2001069177,2.6438627283,3.0005640158,2.0643034299,1.738268593,1.0443904331,0.1557649729,0.4360261024,0.3252116648,0.3480772435,0.5197389426,0.5153291758,0.4361722128,0.582239429,0.2439675218,0.2687769497,-0.838163902,-2.431399792,-7.805079954,-6.465349651,-7.239220986,-11.40445872,-8.994171837,-8.060613393,-13.02939046,-4.738153656,-0.682398929,-1.995373689,-7.479868289,-6.117272407,-6.719482043,-10.88912954,-8.557999624,-7.478373964,-12.78542294,-4.469376706 +050,3,5,37,157,North Carolina,Rockingham County,93643,93663,93681,93309,92722,91930,91825,91697,91326,90844,90680,91118,91285,18,-372,-587,-792,-105,-128,-371,-482,-164,438,167,238,963,893,944,962,955,904,917,867,908,898,212,1018,1051,1172,1100,1162,1124,1196,1129,1233,1320,26,-55,-158,-228,-138,-207,-220,-279,-262,-325,-422,8,2,27,23,25,20,3,2,11,-5,0,-4,-316,-450,-591,29,72,-149,-201,93,770,590,4,-314,-423,-568,54,92,-146,-199,104,765,590,-12,-3,-6,4,-21,-13,-5,-4,-6,-2,-1,1055,1055,1062,1056,1035,1038,1039,1032,1030,1007,1032,1033,10.300016044,9.6005504459,10.22463878,10.470463389,10.407471584,9.8785398556,10.06751935,9.5524558736,9.9891087911,9.8463292819,10.888282796,11.29919207,12.694148994,11.972463334,12.663331917,12.28260929,13.130592304,12.439126507,13.56450566,14.47344616,-0.588266752,-1.698641624,-2.469510214,-1.501999946,-2.255860333,-2.404069434,-3.063072954,-2.886670633,-3.575396869,-4.627116879,0.0213915183,0.2902742016,0.2491172584,0.2721014394,0.2179575201,0.032782765,0.0219575122,0.1211960953,-0.055006106,0,-3.379859886,-4.83790336,-6.401230423,0.3156376697,0.7846470723,-1.628210662,-2.206729977,1.0246578965,8.4709402744,6.4691918444,-3.358468367,-4.547629159,-6.152113164,0.5877391091,1.0026045924,-1.595427897,-2.184772465,1.1458539918,8.4159341687,6.4691918444 +050,3,5,37,159,North Carolina,Rowan County,138428,138493,138329,137819,137505,137689,138091,138520,139417,140289,140870,141818,142495,-164,-510,-314,184,402,429,897,872,581,948,677,382,1539,1531,1539,1521,1590,1650,1595,1549,1624,1573,408,1453,1441,1609,1613,1592,1605,1700,1656,1658,1723,-26,86,90,-70,-92,-2,45,-105,-107,-34,-150,11,-5,26,28,66,91,61,59,82,-10,20,-138,-591,-417,246,447,359,795,922,605,993,805,-127,-596,-391,274,513,450,856,981,687,983,825,-11,0,-13,-20,-19,-19,-4,-4,1,-1,2,4286,4287,4321,4198,4311,4532,4484,4415,4340,4323,4450,4173,11.146196967,11.121442373,11.184836879,11.030531583,11.496289012,11.873194285,11.404832217,11.018676265,11.489698891,11.065269615,10.523342555,10.467667185,11.6935689,11.697730075,11.510749753,11.549379895,12.155620544,11.779811423,11.730246774,12.120444721,0.6228544114,0.6537751885,-0.508732022,-0.667198492,-0.014460741,0.3238143896,-0.750788328,-0.761135158,-0.240547883,-1.055175106,-0.036212466,0.1888683878,0.2034928087,0.4786423961,0.6579637108,0.4389483948,0.4218715365,0.583299841,-0.070749377,0.1406900142,-4.280313455,-3.029158373,1.7878296765,3.24171441,2.5957029908,5.7207208828,6.5926365541,4.3036146807,7.0254131764,5.6627730705,-4.316525921,-2.840289986,1.9913224852,3.7203568061,3.2536667016,6.1596692776,7.0145080906,4.8869145217,6.954663799,5.8034630847 +050,3,5,37,161,North Carolina,Rutherford County,67810,67819,67739,67424,67227,66866,66587,66408,66318,66558,66721,67031,67076,-80,-315,-197,-361,-279,-179,-90,240,163,310,45,156,715,681,690,631,701,662,689,657,674,663,204,824,790,873,831,904,847,869,889,816,928,-48,-109,-109,-183,-200,-203,-185,-180,-232,-142,-265,6,13,25,20,15,-2,4,-4,-7,-7,-6,-28,-216,-98,-188,-86,36,96,428,404,461,316,-22,-203,-73,-168,-71,34,100,424,397,454,310,-10,-3,-15,-10,-8,-10,-5,-4,-2,-2,0,1223,1221,1224,1205,1199,1218,1198,1195,1219,1207,1207,1181,10.579818441,10.115038136,10.291364948,9.4565127798,10.54174969,9.9754381206,10.370571059,9.8590175497,10.078353969,9.8876270441,12.192685868,11.734038366,13.020813913,12.453822694,13.594496034,12.763136085,13.079863933,13.340436228,12.201686704,13.839695169,-1.612867427,-1.61900023,-2.729448965,-2.997309914,-3.052746344,-2.787697964,-2.709292875,-3.481418678,-2.123332735,-3.952068125,0.1923603353,0.371330328,0.2983004333,0.2247982436,-0.030076319,0.0602745506,-0.060206508,-0.105042805,-0.104671332,-0.089480788,-3.196140956,-1.455614886,-2.804024073,-1.288843263,0.5413737359,1.4465892139,6.4420963906,6.0624704567,6.8933548657,4.7126548204,-3.00378062,-1.084284558,-2.50572364,-1.06404502,0.5112974172,1.5068637644,6.3818898823,5.9574276518,6.7886835337,4.6231740327 +050,3,5,37,163,North Carolina,Sampson County,63431,63471,63536,63515,63710,63903,63806,63562,63200,63188,63277,63372,63382,65,-21,195,193,-97,-244,-362,-12,89,95,10,209,853,873,835,840,843,833,841,830,784,780,110,645,608,608,681,693,687,726,704,715,752,99,208,265,227,159,150,146,115,126,69,28,26,46,73,119,132,156,134,141,123,117,86,-58,-273,-134,-145,-385,-554,-641,-266,-159,-91,-105,-32,-227,-61,-26,-253,-398,-507,-125,-36,26,-19,-2,-2,-9,-8,-3,4,-1,-2,-1,0,1,1087,1028,1036,1025,1015,1018,1003,989,987,963,947,872,13.427678649,13.723717823,13.086441037,13.154906859,13.237233842,13.142739938,13.308225464,13.126161389,12.380674147,12.307303912,10.153402964,9.5578699155,9.5288097608,10.664870917,10.881854155,10.839210489,11.488432446,11.133515202,11.291048488,11.865503258,3.2742756846,4.1658479073,3.5576312758,2.4900359411,2.3553796872,2.3035294489,1.8197930183,1.9926461867,1.0896256583,0.4418006532,0.724118661,1.1475731971,1.8650137525,2.0671996492,2.4495948747,2.1141982613,2.2312244833,1.9452022299,1.8476261163,1.3569591492,-4.297486836,-2.106504225,-2.272495749,-6.02933231,-8.699202311,-10.11344094,-4.209260373,-2.514529712,-1.437042535,-1.65675245,-3.573368175,-0.958931028,-0.407481996,-3.962132661,-6.249607437,-7.999242675,-1.978035889,-0.569327482,0.4105835814,-0.2997933 +050,3,5,37,165,North Carolina,Scotland County,36157,36160,36062,36274,36094,35916,35662,35333,35315,35178,34701,34776,34637,-98,212,-180,-178,-254,-329,-18,-137,-477,75,-139,121,475,446,448,452,438,449,493,422,444,435,129,360,391,404,365,380,417,414,422,406,451,-8,115,55,44,87,58,32,79,0,38,-16,4,10,22,17,23,20,14,17,13,13,14,-99,87,-257,-241,-365,-410,-62,-235,-489,26,-138,-95,97,-235,-224,-342,-390,-48,-218,-476,39,-124,5,0,0,2,1,3,-2,2,-1,-2,1,1730,1730,2201,2322,2378,2556,2444,2588,2550,2517,2545,2496,13.133156381,12.325889896,12.442716289,12.629578921,12.338897105,12.710904767,13.987204403,12.078020578,12.78120817,12.533675248,9.9535500995,10.805881052,11.220663797,10.198664394,10.704979224,11.805005096,11.745847105,12.078020578,11.687320984,12.994683993,3.1796062818,1.5200088437,1.2220524927,2.4309145268,1.6339178815,0.9058996716,2.2413572979,0,1.0938871857,-0.461008745,0.2764875028,0.6080035375,0.4721566449,0.6426555646,0.5634199592,0.3963311063,0.4823173932,0.372071724,0.3742245635,0.4033826517,2.4054412741,-7.102586779,-6.69351479,-10.19866439,-11.55010916,-1.755180614,-6.667328671,-13.995621,0.748449127,-3.976200424,2.6819287768,-6.494583241,-6.221358145,-9.55600883,-10.9866892,-1.358849507,-6.185011278,-13.62354928,1.1226736906,-3.572817772 +050,3,5,37,167,North Carolina,Stanly County,60585,60585,60578,60531,60464,60635,60621,60624,60829,61458,62077,62645,63239,-7,-47,-67,171,-14,3,205,629,619,568,594,140,680,635,627,695,701,688,707,704,667,675,132,625,689,645,670,710,732,714,755,692,795,8,55,-54,-18,25,-9,-44,-7,-51,-25,-120,11,23,17,32,38,15,9,9,15,7,3,-20,-123,-15,166,-71,5,244,628,655,588,713,-9,-100,2,198,-33,20,253,637,670,595,716,-6,-2,-15,-9,-6,-8,-4,-1,0,-2,-2,2051,2051,2014,2015,2044,2066,2027,2064,2125,2191,2188,2140,11.229553543,10.4963015,10.355163957,11.463350267,11.563363438,11.32948548,11.562962539,11.397579633,10.695787431,10.724158749,10.32128083,11.388900368,10.652441391,11.050999538,11.711823168,12.054045598,11.677447317,12.223256567,11.096679014,12.63067586,0.908272713,-0.892598868,-0.297277434,0.412350729,-0.14845973,-0.724560118,-0.114484778,-0.825676934,-0.400891583,-1.906517111,0.3798231345,0.2810033472,0.5284932163,0.6267731081,0.2474328838,0.1482054787,0.1471947141,0.242846157,0.1122496432,0.0476629278,-2.031228067,-0.24794413,2.7415585595,-1.17107607,0.0824776279,4.0180151993,10.270920049,10.604282187,9.4289700293,11.327889168,-1.651404933,0.0330592173,3.2700517758,-0.544302962,0.3299105118,4.166220678,10.418114763,10.847128344,9.5412196726,11.375552096 +050,3,5,37,169,North Carolina,Stokes County,47401,47400,47330,47128,46716,46500,46309,46143,45895,45710,45459,45634,45743,-70,-202,-412,-216,-191,-166,-248,-185,-251,175,109,107,427,388,383,395,402,385,402,394,389,384,147,497,477,494,476,562,524,603,603,558,599,-40,-70,-89,-111,-81,-160,-139,-201,-209,-169,-215,1,-2,1,1,1,16,28,33,26,32,23,-27,-129,-332,-101,-107,-17,-136,-14,-67,314,301,-26,-131,-331,-100,-106,-1,-108,19,-41,346,324,-4,-1,8,-5,-4,-5,-1,-3,-1,-2,0,456,456,456,450,456,457,456,458,459,455,455,455,9.0410552838,8.2690422403,8.2174733951,8.512105507,8.6964046208,8.3661096504,8.7768134927,8.6432888372,8.5407221192,8.4047407991,10.523195494,10.165807084,10.599038792,10.257625877,12.157660191,11.386601186,13.165220239,13.228180632,12.25121579,13.110520153,-1.48214021,-1.896764844,-2.381565396,-1.74552037,-3.46125557,-3.020491536,-4.388406746,-4.584891794,-3.710493671,-4.705779354,-0.042346863,0.0213119645,0.0214555441,0.0215496342,0.346125557,0.6084443382,0.7204846897,0.5703693141,0.7025786833,0.5034089541,-2.731372674,-7.075572226,-2.167009955,-2.305810859,-0.367758404,-2.955301071,-0.305660171,-1.469797848,6.8940533301,6.5880910951,-2.773719537,-7.054260262,-2.145554411,-2.284261225,-0.021632847,-2.346856733,0.4148245183,-0.899428534,7.5966320134,7.0915000492 +050,3,5,37,171,North Carolina,Surry County,73673,73752,73779,73499,73292,72637,72480,71990,72024,72114,71957,71741,71683,27,-280,-207,-655,-157,-490,34,90,-157,-216,-58,196,797,795,727,747,738,756,731,746,767,759,182,874,799,863,832,912,886,962,990,971,1006,14,-77,-4,-136,-85,-174,-130,-231,-244,-204,-247,15,4,-6,-9,22,85,54,41,85,3,15,7,-205,-191,-514,-79,-399,117,285,5,-15,172,22,-201,-197,-523,-57,-314,171,326,90,-12,187,-9,-2,-6,4,-15,-2,-7,-5,-3,0,2,870,871,837,817,817,830,824,820,818,812,824,824,10.823069298,10.831726741,9.9637494946,10.295141162,10.216653977,10.498979266,10.143057348,10.356005025,10.675165973,10.584002677,11.868710873,10.886225995,11.82766962,11.466609701,12.625458573,12.304359298,13.348318972,13.743223827,13.514453924,14.028335564,-1.045641576,-0.054499254,-1.863920126,-1.171468539,-2.408804596,-1.805380032,-3.205261624,-3.387218802,-2.839287951,-3.444332887,0.0543190429,-0.081748881,-0.123347655,0.3032036219,1.1767148889,0.7499270904,0.5688992493,1.1799737629,0.0417542346,0.2091700134,-2.783850949,-2.60233938,-7.044521651,-1.088776642,-5.523638126,1.6248420292,3.9545435624,0.0694102213,-0.208771173,2.3984828202,-2.729531906,-2.684088262,-7.167869306,-0.78557302,-4.346923237,2.3747691197,4.5234428117,1.2493839843,-0.167016938,2.6076528336 +050,3,5,37,173,North Carolina,Swain County,13981,13978,14006,14005,14054,13976,14238,14325,14189,14268,14259,14312,14179,28,-1,49,-78,262,87,-136,79,-9,53,-133,51,173,212,189,206,220,189,150,154,159,161,25,203,161,201,162,180,182,197,217,217,250,26,-30,51,-12,44,40,7,-47,-63,-58,-89,2,7,2,2,-1,-1,2,3,15,3,1,3,23,-2,-65,215,47,-145,122,39,110,-46,5,30,0,-63,214,46,-143,125,54,113,-45,-3,-1,-2,-3,4,1,0,1,0,-2,1,244,244,244,243,238,243,246,245,246,245,246,246,12.352290172,15.111016073,13.485551195,14.602679521,15.404544341,13.256645858,10.542221597,10.796789007,11.130166953,11.301814608,14.494305808,11.47581881,14.341776668,11.483660594,12.603718097,12.765658975,13.845451031,15.213657237,15.190227853,17.549401565,-2.142015637,3.6351972629,-0.856225473,3.1190189268,2.8008262437,0.4909868836,-3.303229434,-4.41686823,-4.060060901,-6.247586957,0.4998036486,0.1425567554,0.1427042455,-0.070886794,-0.070020656,0.1402819668,0.2108444319,1.0516352929,0.21000315,0.0701976063,1.6422119881,-0.142556755,-4.637887977,15.240660665,3.2909708364,-10.17044259,8.5743402326,2.7342517615,7.7001155017,-3.229089888,2.1420156367,0,-4.495183732,15.169773871,3.2209501803,-10.03016062,8.7851846646,3.7858870544,7.9101186518,-3.158892282 +050,3,5,37,175,North Carolina,Transylvania County,33090,33089,33087,32812,32849,32847,32971,33185,33433,33812,34182,34270,34498,-2,-275,37,-2,124,214,248,379,370,88,228,61,280,257,234,292,286,273,249,285,256,268,82,415,368,426,389,396,412,456,431,411,448,-21,-135,-111,-192,-97,-110,-139,-207,-146,-155,-180,4,-5,-1,10,2,6,11,8,14,4,6,20,-132,154,178,217,318,377,576,501,239,406,24,-137,153,188,219,324,388,584,515,243,412,-5,-3,-5,2,2,0,-1,2,1,0,-4,1070,1069,1064,1057,1050,1064,1095,1075,1047,1051,1031,1007,8.4978527747,7.8280866877,7.1237213833,8.8729526877,8.6462301227,8.1959830676,7.4057550747,8.3830926258,7.4796938,7.7943229409,12.595031791,11.209089109,12.968826108,11.820474642,11.971703247,12.369029391,13.562346643,12.677589199,12.008414656,13.029315961,-4.097179016,-3.381002422,-5.845104725,-2.947521954,-3.325473124,-4.173046324,-6.156591568,-4.294496573,-4.528720855,-5.23499302,-0.151747371,-0.030459481,0.3044325377,0.0607736485,0.1813894431,0.330241076,0.237935906,0.4118010413,0.1168702156,0.1744997673,-4.006130594,4.6907601164,5.4188991719,6.5939408672,9.6136404861,11.318262332,17.131385233,14.736594405,6.9829953836,11.80781759,-4.157877965,4.6603006351,5.7233317097,6.6547145158,9.7950299293,11.648503407,17.369321139,15.148395447,7.0998655993,11.982317357 +050,3,5,37,177,North Carolina,Tyrrell County,4407,4407,4415,4336,4122,4102,4119,4137,4017,4172,4113,3813,3774,8,-79,-214,-20,17,18,-120,155,-59,-300,-39,15,43,39,37,51,37,42,44,35,33,27,4,65,46,36,32,44,49,40,44,42,41,11,-22,-7,1,19,-7,-7,4,-9,-9,-14,0,-1,0,1,2,1,0,0,0,0,0,-3,-57,-216,-21,-2,22,-114,149,-51,-291,-25,-3,-58,-216,-20,0,23,-114,149,-51,-291,-25,0,1,9,-1,-2,2,1,2,1,0,0,632,623,632,486,497,508,582,479,627,622,402,402,9.8274482916,9.2220383069,8.9980544747,12.407249726,8.9631782946,10.301692421,10.746122848,8.4490042245,8.3270249811,7.1174377224,14.855445092,10.877275952,8.7548638132,7.7849410047,10.658914729,12.018641158,9.7692025888,10.621605311,10.598031794,10.807960986,-5.0279968,-1.655237645,0.2431906615,4.6223087216,-1.695736434,-1.716948737,0.9769202589,-2.172601086,-2.271006813,-3.690523263,-0.228545309,0,0.2431906615,0.4865588128,0.242248062,0,0,0,0,0,-13.02708262,-51.07590447,-5.107003891,-0.486558813,5.3294573643,-27.96173657,36.390279643,-12.31140616,-73.42922029,-6.590220113,-13.25562793,-51.07590447,-4.86381323,0,5.5717054264,-27.96173657,36.390279643,-12.31140616,-73.42922029,-6.590220113 +050,3,5,37,179,North Carolina,Union County,201292,201328,202110,204916,208106,212261,217767,222051,226501,231525,236217,240028,244562,782,2806,3190,4155,5506,4284,4450,5024,4692,3811,4534,591,2367,2380,2338,2353,2366,2464,2336,2496,2287,2374,300,1215,1157,1277,1319,1332,1353,1496,1481,1573,1673,291,1152,1223,1061,1034,1034,1111,840,1015,714,701,40,57,83,105,74,118,128,147,123,70,80,435,1598,1882,2955,4326,3117,3212,4037,3563,3040,3774,475,1655,1965,3060,4400,3235,3340,4184,3686,3110,3854,16,-1,2,34,72,15,-1,0,-9,-13,-21,2050,2050,2116,2107,2276,2167,2211,2286,2665,2801,2848,2849,11.630706638,11.524809816,11.123613414,10.943473448,10.758995766,10.986463108,10.200294306,10.672550252,9.6043003076,9.7979735446,5.970134586,5.602607125,6.0756434259,6.1344842661,6.057050871,6.0327453673,6.5323802579,6.3325508507,6.6058436309,6.9048061248,5.6605720519,5.9222026914,5.0479699881,4.8089891821,4.7019448954,4.9537177406,3.6679140485,4.3399994014,2.9984566767,2.8931674199,0.280080388,0.4019156365,0.4995634767,0.3441636359,0.5365855877,0.5707253563,0.6418849585,0.5259309619,0.2939663409,0.3301760251,7.8520782456,9.1133159977,14.059143558,20.119620118,14.174044718,14.321639409,17.627820255,15.23489445,12.766538231,15.576053984,8.1321586336,9.5152316342,14.558707035,20.463783754,14.710630306,14.892364765,18.269705213,15.760825412,13.060504572,15.906230009 +050,3,5,37,181,North Carolina,Vance County,45422,45412,45293,45293,45104,44507,44533,44477,44558,44387,44735,44670,44718,-119,0,-189,-597,26,-56,81,-171,348,-65,48,156,558,600,560,572,547,543,556,575,570,558,154,450,433,518,500,491,527,572,547,524,567,2,108,167,42,72,56,16,-16,28,46,-9,-3,-14,-14,-2,14,51,89,103,98,88,64,-121,-92,-348,-648,-52,-159,-22,-259,225,-200,-8,-124,-106,-362,-650,-38,-108,67,-156,323,-112,56,3,-2,6,11,-8,-4,-2,1,-3,1,1,846,841,855,876,658,749,750,811,782,802,802,802,12.319784514,13.274776818,12.49846559,12.848158131,12.290753848,12.197450441,12.502108044,12.903660151,12.750964711,12.484897302,9.9353100921,9.5799639369,11.561080671,11.230907457,11.032468262,11.83804122,12.861880938,12.275308005,11.721939489,12.686266613,2.3844744221,3.694812881,0.9373849193,1.6172506739,1.2582855859,0.3594092211,-0.359772893,0.6283521465,1.0290252223,-0.201369311,-0.309098536,-0.309744792,-0.044637377,0.3144654088,1.1459386586,1.9992137923,2.316038001,2.1992325127,1.9685699905,1.4319595471,-2.031218952,-7.699370554,-14.46251018,-1.168014376,-3.572632289,-0.494187679,-5.823823711,5.0492583201,-4.474022706,-0.178994943,-2.340317488,-8.009115347,-14.50714756,-0.853548967,-2.42669363,1.5050261133,-3.50778571,7.2484908328,-2.505452715,1.2529646037 +050,3,5,37,183,North Carolina,Wake County,900993,901036,906875,928905,952266,974508,998221,1022871,1048933,1072463,1092202,1112795,1132271,5839,22030,23361,22242,23713,24650,26062,23530,19739,20593,19476,3209,12539,12259,12299,12620,12764,12901,12690,12841,12676,12716,1055,4387,4550,4778,4840,5319,5336,5729,5831,6011,6757,2154,8152,7709,7521,7780,7445,7565,6961,7010,6665,5959,762,2367,3581,3750,3620,3835,4182,4544,3468,3654,2854,2730,11435,11766,10790,12082,13241,14251,11973,9248,10251,10635,3492,13802,15347,14540,15702,17076,18433,16517,12716,13905,13489,193,76,305,181,231,129,64,52,13,23,28,20983,20992,20937,20958,20854,20930,20739,21549,22132,22340,21812,21362,13.660678295,13.033371235,12.766416819,12.794458844,12.630795629,12.453880773,11.963820051,11.864191457,11.497521312,11.327952051,4.7794398022,4.8374124415,4.9595852965,4.906908146,5.2634912216,5.1510664136,5.401160368,5.387438703,5.4521616129,6.0194221462,8.8812384926,8.1959587938,7.8068315225,7.8875506975,7.3673044077,7.3028143589,6.5626596826,6.4767527539,6.0453596989,5.3085299051,2.5787403719,3.8072030666,3.8925167145,3.6700428695,3.7949781603,4.0370614209,4.283971498,3.2041909487,3.3142902235,2.5424642305,12.457919794,12.509229623,11.200068093,12.249021533,13.102817685,13.757092852,11.287850076,8.5445091966,9.297971834,9.4741090017,15.036660166,16.31643269,15.092584808,15.919064403,16.897795845,17.794154273,15.571821574,11.748700145,12.612262057,12.016573232 +050,3,5,37,185,North Carolina,Warren County,20972,21016,20974,20986,20750,20584,20364,20190,19874,19829,19815,19692,19522,-42,12,-236,-166,-220,-174,-316,-45,-14,-123,-170,46,219,157,174,195,174,192,172,172,157,148,59,217,206,246,236,234,258,284,256,255,272,-13,2,-49,-72,-41,-60,-66,-112,-84,-98,-124,1,5,14,-8,-4,-6,-5,-7,-7,-7,-4,-27,7,-203,-89,-171,-108,-244,75,79,-18,-40,-26,12,-189,-97,-175,-114,-249,68,72,-25,-44,-3,-2,2,3,-4,0,-1,-1,-2,0,-2,1168,1168,1174,1182,1037,1031,982,894,894,927,921,912,10.438512869,7.5234809277,8.4192190449,9.5242746899,8.5811510578,9.5846645367,8.6643326701,8.6772273232,7.9479585896,7.548324578,10.343183985,9.8715737014,11.903033822,11.526814496,11.540168664,12.879392971,14.306223711,12.914942993,12.909104716,13.872596522,0.0953288847,-2.348092774,-3.483814777,-2.002539807,-2.959017606,-3.294728435,-5.641891041,-4.237715669,-4.961146126,-6.324271944,0.2383222116,0.6708836496,-0.387090531,-0.195369737,-0.295901761,-0.249600639,-0.35261819,-0.353142972,-0.35436758,-0.204008772,0.3336510963,-9.727812919,-4.306382155,-8.352056266,-5.326231691,-12.18051118,3.7780520364,3.9854706891,-0.911230921,-2.040087724,0.5719733079,-9.05692927,-4.693472686,-8.547426004,-5.622133452,-12.43011182,3.4254338463,3.6323277167,-1.265598502,-2.244096496 +050,3,5,37,187,North Carolina,Washington County,13228,13193,13119,12904,12662,12669,12479,12251,12081,11947,11793,11635,11485,-74,-215,-242,7,-190,-228,-170,-134,-154,-158,-150,29,122,132,129,137,115,128,133,129,125,128,73,134,143,177,131,149,163,172,155,166,179,-44,-12,-11,-48,6,-34,-35,-39,-26,-41,-51,2,11,10,10,11,-6,-4,-5,-5,-5,-3,-34,-215,-247,46,-210,-190,-130,-89,-123,-111,-94,-32,-204,-237,56,-199,-196,-134,-94,-128,-116,-97,2,1,6,-1,3,2,-1,-1,0,-1,-2,151,151,152,152,151,146,147,151,147,145,149,149,9.3763209469,10.326214504,10.185148632,10.895498648,9.3004448039,10.521124445,11.070417846,10.867733783,10.670991975,11.07266436,10.298582024,11.186732379,13.974971379,10.418323525,12.050141529,13.397994411,14.316630598,13.058129739,14.171077343,15.484429066,-0.922261077,-0.860517875,-3.789822747,0.4771751233,-2.749696725,-2.876869965,-3.246212752,-2.190395956,-3.500085368,-4.411764706,0.845405987,0.7822889775,0.7895464056,0.8748210593,-0.485240598,-0.328785139,-0.416181122,-0.421229992,-0.426839679,-0.259515571,-16.52384429,-19.32253775,3.6319134657,-16.70112931,-15.36595228,-10.68551701,-7.408023972,-10.36225779,-9.475840874,-8.131487889,-15.6784383,-18.54024877,4.4214598713,-15.82630826,-15.85119288,-11.01430215,-7.824205094,-10.78348778,-9.902680553,-8.39100346 +050,3,5,37,189,North Carolina,Watauga County,51079,51061,50972,51636,52079,52320,52421,53129,54176,55250,56205,56271,56441,-89,664,443,241,101,708,1047,1074,955,66,170,73,360,362,343,352,372,337,383,390,332,328,97,362,314,320,300,327,347,346,352,381,424,-24,-2,48,23,52,45,-10,37,38,-49,-96,1,1,20,29,14,57,60,58,56,45,31,-67,659,365,191,47,596,989,970,854,68,232,-66,660,385,220,61,653,1049,1028,910,113,263,1,6,10,-2,-12,10,8,9,7,2,3,5323,5324,5686,5974,5861,5693,5789,5840,5896,5845,5764,5759,7.0169967254,6.9806681772,6.5709441661,6.7213412131,7.0487920417,6.2811611761,7.0001644947,6.9983401373,5.9034816316,5.8201433743,7.0559800405,6.0550547173,6.1303269188,5.7284158066,6.196115585,6.4675457807,6.3239083947,6.3164505854,6.7747786194,7.5235999716,-0.038983315,0.92561346,0.4406172473,0.9929254065,0.8526764567,-0.186384605,0.6762561,0.6818895518,-0.871296988,-1.703456597,0.0194916576,0.385672275,0.555560877,0.267326071,1.0800568451,1.1183076278,1.0600771297,1.0048898659,0.8001707031,0.5500745262,12.845002339,7.0385190185,3.6590388797,0.8974518097,11.293225959,18.433437398,17.728876135,15.324570454,1.2091468402,4.1166867769,12.864493997,7.4241912934,4.2145997567,1.1647778807,12.373282804,19.551745026,18.788953265,16.32946032,2.0093175433,4.6667613031 +050,3,5,37,191,North Carolina,Wayne County,122623,122665,122891,124055,124587,124625,124634,124400,124368,123201,123483,123904,123967,226,1164,532,38,9,-234,-32,-1167,282,421,63,399,1659,1770,1727,1740,1697,1634,1574,1647,1635,1609,224,1146,1116,1114,1107,1155,1178,1260,1289,1375,1521,175,513,654,613,633,542,456,314,358,260,88,79,121,455,369,338,419,320,285,218,229,207,-12,530,-566,-950,-964,-1200,-806,-1775,-290,-69,-236,67,651,-111,-581,-626,-781,-486,-1490,-72,160,-29,-16,0,-11,6,2,5,-2,9,-4,1,4,3219,3177,3342,3277,2916,2969,2995,3010,2307,2472,2962,2896,13.436135835,14.237337216,13.859685729,13.961381535,13.628661147,13.136737844,12.715646951,13.353115727,13.218156168,12.982559477,9.2813813546,8.9767617699,8.9401794456,8.8823272179,9.2758418529,9.470671469,10.178980405,10.450616984,11.11618638,12.272512718,4.1547544807,5.2605754458,4.9195062838,5.079054317,4.3528192938,3.6660663751,2.5366665455,2.9024987433,2.1019697882,0.7100467582,0.9799713298,3.6598804707,2.9613341252,2.7120384821,3.3650023692,2.572678158,2.302388425,1.7674433688,1.8513503135,1.6702236244,4.2924364031,-4.552730432,-7.624030946,-7.734926322,-9.637238289,-6.47993311,-14.33943668,-2.351186133,-0.557830444,-1.904216306,5.2724077329,-0.892849961,-4.66269682,-5.02288784,-6.27223592,-3.907254952,-12.03704826,-0.583742764,1.2935198697,-0.233992682 +050,3,5,37,193,North Carolina,Wilkes County,69340,69311,69265,68949,68910,68610,68418,68302,68573,68461,68481,68296,68043,-46,-316,-39,-300,-192,-116,271,-112,20,-185,-253,171,680,674,686,651,690,707,662,693,677,679,165,695,710,806,828,824,814,814,858,848,906,6,-15,-36,-120,-177,-134,-107,-152,-165,-171,-227,-1,-11,3,27,23,64,47,40,46,37,30,-44,-288,7,-199,-24,-37,335,4,143,-48,-57,-45,-299,10,-172,-1,27,382,44,189,-11,-27,-7,-2,-13,-8,-14,-9,-4,-4,-4,-3,1,967,967,989,934,965,961,961,983,974,918,952,927,9.8398136224,9.7781066162,9.9767306574,9.5017076802,10.093622001,10.330593607,9.6618357488,10.121073155,9.8993251789,9.9604661909,10.056868335,10.300379373,11.721931355,12.085121289,12.053832651,11.894063927,11.880263292,12.530852478,12.399745571,13.290401132,-0.217054712,-0.522272757,-1.745200698,-2.583413609,-1.96021065,-1.56347032,-2.218427544,-2.409779323,-2.500420392,-3.329934942,-0.159173456,0.0435227297,0.3926701571,0.3356978136,0.9362200117,0.6867579909,0.583796722,0.6718172657,0.5410266346,0.4400795077,-4.167450475,0.1015530361,-2.894124491,-0.350293371,-0.541252194,4.8949771689,0.0583796722,2.0884754129,-0.701872391,-0.836151065,-4.326623931,0.1450757658,-2.501454334,-0.014595557,0.3949678174,5.5817351598,0.6421763942,2.7602926787,-0.160845756,-0.396071557 +050,3,5,37,195,North Carolina,Wilson County,81234,81225,81294,81153,81393,81186,80996,81228,81298,81446,81396,81775,81979,69,-141,240,-207,-190,232,70,148,-50,379,204,235,1016,985,922,942,944,963,944,990,964,973,221,801,745,895,825,837,815,853,935,971,1011,14,215,240,27,117,107,148,91,55,-7,-38,13,44,73,89,62,74,94,79,85,46,51,51,-400,-56,-318,-363,61,-168,-18,-187,338,190,64,-356,17,-229,-301,135,-74,61,-102,384,241,-9,0,-17,-5,-6,-10,-4,-4,-3,2,1,1593,1593,1571,1565,1526,1469,1504,1564,1487,1543,1543,1541,12.508695144,12.119646131,11.342178264,11.616578905,11.638228622,11.850411626,11.601042128,12.159025313,11.815825116,11.883679177,9.8616779627,9.1666359061,11.010032046,10.173755411,10.319064997,10.029164564,10.482721329,11.483523907,11.901624676,12.347789978,2.647017181,2.9530102248,0.3321462181,1.4428234946,1.3191636256,1.821247062,1.1183207983,0.6755014063,-0.08579956,-0.4641108,0.541715144,0.8982072767,1.0948523487,0.7645731339,0.9123187691,1.1567379988,0.9708499238,1.0439567188,0.5638256798,0.6228855478,-4.924683127,-0.689035719,-3.911944347,-4.476452381,0.7520465529,-2.06736153,-0.221206312,-2.296704781,4.1428930386,2.3205540017,-4.382967983,0.2091715576,-2.817091998,-3.711879247,1.664365322,-0.910623531,0.7496436121,-1.252748063,4.7067187184,2.9434395496 +050,3,5,37,197,North Carolina,Yadkin County,38406,38412,38435,38344,38149,38070,37852,37630,37650,37599,37456,37617,37625,23,-91,-195,-79,-218,-222,20,-51,-143,161,8,131,390,389,405,412,359,375,376,393,377,364,92,389,370,396,444,436,447,450,457,447,469,39,1,19,9,-32,-77,-72,-74,-64,-70,-105,-4,-15,-9,-1,3,28,5,-3,12,-10,-4,-8,-76,-205,-83,-185,-171,90,28,-89,243,116,-12,-91,-214,-84,-182,-143,95,25,-77,233,112,-4,-1,0,-4,-4,-2,-3,-2,-2,-2,1,304,304,308,304,303,304,303,304,297,277,283,283,10.159027859,10.170865308,10.627271415,10.853244119,9.5122015845,9.962805526,9.9934882856,10.472320298,10.043557604,9.6754472236,10.13297907,9.674087825,10.391109828,11.696214536,11.552423094,11.875664187,11.960291831,12.177736327,11.908409148,12.466441615,0.0260487894,0.4967774829,0.236161587,-0.842970417,-2.04022151,-1.912858661,-1.966803546,-1.705416028,-1.864851544,-2.790994391,-0.390731841,-0.23531565,-0.026240176,0.0790284766,0.7418987308,0.132837407,-0.079735279,0.3197655053,-0.266407363,-0.106323596,-1.979707993,-5.359967579,-2.177934636,-4.873422723,-4.530881535,2.3910733262,0.7441959362,-2.371594164,6.473698933,3.0833842801,-2.370439834,-5.595283229,-2.204174812,-4.794394247,-3.788982804,2.5239107333,0.6644606573,-2.051828659,6.2072915695,2.9770606842 +050,3,5,37,199,North Carolina,Yancey County,17818,17817,17805,17691,17625,17550,17543,17550,17590,17709,17893,18059,18099,-12,-114,-66,-75,-7,7,40,119,184,166,40,43,154,185,168,160,188,145,181,181,170,178,37,222,237,232,216,223,221,213,234,242,249,6,-68,-52,-64,-56,-35,-76,-32,-53,-72,-71,1,1,1,-1,1,-1,2,1,5,-1,3,-18,-45,-12,-9,51,44,117,149,233,240,108,-17,-44,-11,-10,52,43,119,150,238,239,111,-1,-2,-3,-1,-3,-1,-3,1,-1,-1,0,165,165,163,168,174,165,164,157,157,152,153,153,8.677034032,10.476837694,9.552238806,9.1186276465,10.714387485,8.2527034718,10.255248024,10.167968092,9.4570538496,9.8456773052,12.508451657,13.421678559,13.191186923,12.310147323,12.709087282,12.578258395,12.068330548,13.145328914,13.462394304,13.772885668,-3.831417625,-2.944840865,-3.638948117,-3.191519676,-1.994699798,-4.325554923,-1.813082524,-2.977360822,-4.005340454,-3.927208363,0.0563443768,0.0566315551,-0.056858564,0.0569914228,-0.056991423,0.1138303927,0.0566588289,0.2808830965,-0.055629729,0.1659383815,-2.535496957,-0.679578661,-0.511727079,2.9065625623,2.5076226028,6.6590779738,8.4421655004,13.089152295,13.351134846,5.9737817357,-2.479152581,-0.622947106,-0.568585643,2.9635539851,2.45063118,6.7729083665,8.4988243293,13.370035391,13.295505118,6.1397201173 +040,2,4,38,000,North Dakota,North Dakota,672591,672575,674752,685526,702227,723149,738736,755537,756114,756755,760062,763724,765309,2177,10774,16701,20922,15587,16801,577,641,3307,3662,1585,2343,9211,9883,10272,10977,11399,11406,11076,10700,10506,10509,1493,6045,5934,6220,6204,6315,6143,6375,6454,6181,6738,850,3166,3949,4052,4773,5084,5263,4701,4246,4325,3771,468,1209,1295,1254,961,2247,1589,2875,1247,634,577,814,6333,11000,15125,9526,9301,-6316,-6975,-2196,-1282,-2766,1282,7542,12295,16379,10487,11548,-4727,-4100,-949,-648,-2189,45,66,457,491,327,169,41,40,10,-15,3,25056,25061,25765,26480,26497,26614,26394,26034,25889,25659,24832,24634,13.542819924,14.243168633,14.413039086,15.017597143,15.256917578,15.090784844,14.642378157,14.108491664,13.789337873,13.745942697,8.8878890933,8.5519541302,8.7275217206,8.4876717389,8.4522707698,8.1275373747,8.4276959869,8.5099257195,8.1126877396,8.813413445,4.6549308303,5.6912145029,5.6855173652,6.5299254045,6.8046468082,6.9632474692,6.2146821701,5.5985659443,5.6766501333,4.9325292521,1.7775778187,1.8663263563,1.7595357295,1.3147408996,3.0074825684,2.1023371135,3.8007256411,1.6442326266,0.8321378461,0.7547253722,9.3113319483,15.852965189,21.222470422,13.032488876,12.448863093,-8.356426186,-9.220890903,-2.895537168,-1.682650976,-3.617972928,11.088909767,17.719291545,22.982006151,14.347229775,15.456345661,-6.254089072,-5.420165262,-1.251304541,-0.85051313,-2.863247556 +050,2,4,38,001,North Dakota,Adams County,2343,2343,2351,2312,2334,2391,2387,2396,2339,2329,2272,2227,2188,8,-39,22,57,-4,9,-57,-10,-57,-45,-39,9,19,17,35,21,25,21,25,24,21,23,7,23,28,38,31,31,35,28,39,16,30,2,-4,-11,-3,-10,-6,-14,-3,-15,5,-7,0,0,3,4,5,8,8,19,7,6,6,6,-34,30,53,4,5,-50,-26,-48,-58,-35,6,-34,33,57,9,13,-42,-7,-41,-52,-29,0,-1,0,3,-3,2,-1,0,-1,2,-3,52,52,51,46,56,56,57,51,53,51,48,48,8.149260133,7.3181231167,14.814814815,8.7902888238,10.453690153,8.8701161563,10.711225364,10.432514671,9.3354078684,10.419026048,9.8648938452,12.053379251,16.084656085,12.976140645,12.962575789,14.783526927,11.996572408,16.95283634,7.1126917093,13.590033975,-1.715633712,-4.735256134,-1.26984127,-4.185851821,-2.508885637,-5.913410771,-1.285347044,-6.520321669,2.2227161591,-3.171007928,0,1.2914334912,1.6931216931,2.0929259104,3.3451808488,3.3790918691,8.1405312768,3.042816779,2.667259391,2.718006795,-14.58288655,12.914334912,22.433862434,1.6743407283,2.0907380305,-21.11932418,-11.13967438,-20.86502934,-25.78350745,-15.85503964,-14.58288655,14.205768403,24.126984127,3.7672666388,5.4359188794,-17.74023231,-2.999143102,-17.82221256,-23.11624806,-13.13703284 +050,2,4,38,003,North Dakota,Barnes County,11066,11064,11065,11115,11009,11116,11068,11017,10910,10694,10540,10414,10402,1,50,-106,107,-48,-51,-107,-216,-154,-126,-12,33,114,118,110,135,100,110,108,95,89,89,45,121,135,138,132,130,124,123,139,135,130,-12,-7,-17,-28,3,-30,-14,-15,-44,-46,-41,10,26,6,1,-4,-1,-3,-1,-2,-2,0,4,32,-97,133,-44,-20,-90,-200,-107,-79,30,14,58,-91,134,-48,-21,-93,-201,-109,-81,30,-1,-1,2,1,-3,0,0,0,-1,1,-1,492,492,507,515,533,541,539,537,537,534,532,532,10.279531109,10.667148798,9.9435028249,12.170934006,9.0559203079,10.033292288,9.998148491,8.9479137233,8.4947981292,8.5511145273,10.910730388,12.203941421,12.474576271,11.900468806,11.7726964,11.310256761,11.386780226,13.092210606,12.885367949,12.490392006,-0.631199279,-1.536792623,-2.531073446,0.2704652001,-2.716776092,-1.276964473,-1.388631735,-4.144296882,-4.39056982,-3.939277479,2.3444544635,0.5423973965,0.0903954802,-0.360620267,-0.090559203,-0.273635244,-0.092575449,-0.188377131,-0.19089434,0,2.8854824166,-8.76875791,12.02259887,-3.966822935,-1.811184062,-8.209057327,-18.5150898,-10.07817651,-7.540326429,2.8823981553,5.2299368801,-8.226360513,12.11299435,-4.327443202,-1.901743265,-8.482692571,-18.60766525,-10.26655364,-7.731220769,2.8823981553 +050,2,4,38,005,North Dakota,Benson County,6660,6660,6677,6688,6771,6900,6887,6822,6848,6920,6934,6837,6762,17,11,83,129,-13,-65,26,72,14,-97,-75,37,132,155,160,154,144,173,155,135,158,141,25,81,65,75,82,75,79,73,55,56,81,12,51,90,85,72,69,94,82,80,102,60,1,7,1,0,0,0,1,1,1,1,1,3,-45,-7,43,-86,-134,-68,-12,-66,-200,-137,4,-38,-6,43,-86,-134,-67,-11,-65,-199,-136,1,-2,-1,1,1,0,-1,1,-1,0,1,16,16,17,16,16,16,16,16,16,16,16,16,19.75308642,23.032914778,23.407212347,22.339885399,21.008096871,25.310899781,22.515979082,19.488956258,22.946772202,20.736818884,12.121212121,9.6589642618,10.972130788,11.895263654,10.94171712,11.558156547,10.604299826,7.9399451422,8.1330331857,11.912640635,7.6318742985,13.373950516,12.43508156,10.444621745,10.066379751,13.752743233,11.911679256,11.549011116,14.813739017,8.8241782484,1.0475121586,0.1485994502,0,0,0,0.1463057791,0.1452643812,0.1443626389,0.1452327355,0.1470696375,-6.734006734,-1.040196151,6.2906883183,-12.47552042,-19.54920125,-9.948792977,-1.743172574,-9.527934171,-29.04654709,-20.14854033,-5.686494575,-0.891596701,6.2906883183,-12.47552042,-19.54920125,-9.802487198,-1.597908193,-9.383571532,-28.90131436,-20.0014707 +050,2,4,38,007,North Dakota,Billings County,783,784,783,845,921,913,922,950,950,924,923,937,890,-1,62,76,-8,9,28,0,-26,-1,14,-47,1,5,9,14,15,18,18,15,9,12,10,0,4,1,1,2,1,7,8,9,7,7,1,1,8,13,13,17,11,7,0,5,3,4,11,6,3,0,2,2,2,0,0,0,-6,49,60,-24,-5,10,-14,-35,-1,9,-49,-2,60,66,-21,-5,12,-12,-33,-1,9,-49,0,1,2,0,1,-1,1,0,0,0,-1,9,9,9,9,9,9,9,9,9,9,9,9,6.1425061425,10.192525481,15.267175573,16.348773842,19.230769231,18.947368421,16.008537887,9.7455332972,12.903225806,10.946907499,4.914004914,1.1325028313,1.0905125409,2.1798365123,1.0683760684,7.3684210526,8.537886873,9.7455332972,7.5268817204,7.662835249,1.2285012285,9.0600226501,14.176663032,14.16893733,18.162393162,11.578947368,7.4706510139,0,5.376344086,3.2840722496,13.513513514,6.7950169875,3.2715376227,0,2.1367521368,2.1052631579,2.1344717182,0,0,0,60.196560197,67.950169875,-26.17230098,-5.449591281,10.683760684,-14.73684211,-37.35325507,-1.082837033,9.6774193548,-53.63984674,73.71007371,74.745186863,-22.90076336,-5.449591281,12.820512821,-12.63157895,-35.21878335,-1.082837033,9.6774193548,-53.63984674 +050,2,4,38,009,North Dakota,Bottineau County,6429,6429,6441,6500,6606,6744,6689,6742,6582,6531,6398,6292,6287,12,59,106,138,-55,53,-160,-51,-133,-106,-5,16,77,50,80,83,68,66,65,72,62,64,11,96,73,73,72,68,85,96,88,74,84,5,-19,-23,7,11,0,-19,-31,-16,-12,-20,5,13,5,2,3,9,3,9,6,2,3,3,64,120,127,-71,44,-145,-29,-122,-96,11,8,77,125,129,-68,53,-142,-20,-116,-94,14,-1,1,4,2,2,0,1,0,-1,0,1,270,266,275,280,262,233,268,234,243,232,224,219,11.900162275,7.6300930871,11.985018727,12.35762674,10.125828308,9.9069348544,9.9138259742,11.13775234,9.7714736013,10.175689641,14.836565953,11.139935907,10.936329588,10.719868979,10.125828308,12.758931252,14.641958362,13.612808415,11.662726556,13.355592654,-2.936403678,-3.50984282,1.0486891386,1.6377577607,0,-2.851996397,-4.728132388,-2.475056075,-1.891252955,-3.179903013,2.0091183062,0.7630093087,0.2996254682,0.4466612075,1.3401831584,0.4503152207,1.3726835964,0.9281460283,0.3152088258,0.4769854519,9.8910439688,18.312223409,19.026217228,-10.57098191,6.552006552,-21.76523566,-4.423091588,-18.87230258,-15.13002364,1.7489466571,11.900162275,19.075232718,19.325842697,-10.1243207,7.8921897104,-21.31492044,-3.050407992,-17.94415655,-14.81481481,2.2259321091 +050,2,4,38,011,North Dakota,Bowman County,3151,3151,3142,3142,3210,3213,3236,3276,3222,3149,3061,3036,2986,-9,0,68,3,23,40,-54,-73,-88,-25,-50,10,39,43,44,40,48,42,39,27,39,33,21,47,44,54,46,45,29,37,34,27,32,-11,-8,-1,-10,-6,3,13,2,-7,12,1,2,0,0,0,0,0,0,0,0,0,0,0,9,68,13,30,35,-67,-75,-82,-36,-51,2,9,68,13,30,35,-67,-75,-82,-36,-51,0,-1,1,0,-1,2,0,0,1,-1,0,82,82,82,80,67,65,64,62,60,57,61,60,12.41247613,13.539042821,13.700762883,12.405024035,14.742014742,12.927054478,12.242975985,8.6956521739,12.793176972,10.959814015,14.95862508,13.853904282,16.81457263,14.26577764,13.820638821,8.9258233303,11.615131063,10.950080515,8.856814827,10.627698439,-2.54614895,-0.314861461,-3.113809746,-1.860753605,0.9213759214,4.001231148,0.6278449223,-2.254428341,3.9363621453,0.3321155762,0,0,0,0,0,0,0,0,0,0,2.8644175684,21.410579345,4.0479526701,9.3037680261,10.749385749,-20.62172976,-23.54418459,-26.40901771,-11.80908644,-16.93789439,2.8644175684,21.410579345,4.0479526701,9.3037680261,10.749385749,-20.62172976,-23.54418459,-26.40901771,-11.80908644,-16.93789439 +050,2,4,38,013,North Dakota,Burke County,1968,1968,1972,2063,2184,2307,2263,2346,2226,2136,2100,2131,2118,4,91,121,123,-44,83,-120,-90,-36,31,-13,2,25,29,37,39,44,37,39,32,27,24,0,25,22,23,29,25,22,20,21,10,15,2,0,7,14,10,19,15,19,11,17,9,0,0,-1,0,0,1,0,3,2,2,2,2,91,109,106,-53,62,-138,-111,-49,13,-23,2,91,108,106,-53,63,-138,-108,-47,15,-21,0,0,6,3,-1,1,3,-1,0,-1,-1,2,2,2,2,2,2,2,2,2,2,2,2,12.39157373,13.656698846,16.477399243,17.067833698,19.093078759,16.185476815,17.88170564,15.108593012,12.762940203,11.296775712,12.39157373,10.360254297,10.242707637,12.691466083,10.848340204,9.6237970254,9.1701054562,9.9150141643,4.7270148901,7.06048482,0,3.2964445491,6.2346916054,4.3763676149,8.244738555,6.56167979,8.7116001834,5.193578848,8.0359253132,4.236290892,0,-0.47092065,0,0,0.4339336082,0,1.3755158184,0.9442870633,0.945402978,0.941397976,45.105328377,51.330350836,47.205522155,-23.19474836,26.903883706,-60.36745407,-50.89408528,-23.13503305,6.1451193571,-10.82607672,45.105328377,50.859430186,47.205522155,-23.19474836,27.337817314,-60.36745407,-49.51856946,-22.19074599,7.0905223351,-9.884678748 +050,2,4,38,015,North Dakota,Burleigh County,81308,81308,81708,83315,85787,88472,90571,93284,94642,95343,95530,95816,96212,400,1607,2472,2685,2099,2713,1358,701,187,286,396,299,1107,1197,1187,1313,1403,1320,1317,1272,1144,1160,164,664,646,656,648,712,714,730,767,748,822,135,443,551,531,665,691,606,587,505,396,338,13,32,12,23,45,173,128,212,157,55,64,239,1126,1848,2080,1354,1825,625,-96,-473,-168,-9,252,1158,1860,2103,1399,1998,753,116,-316,-113,55,13,6,61,51,35,24,-1,-2,-2,3,3,2763,2763,2911,2906,3045,3317,3479,3505,3666,3714,3867,3846,13.416311666,14.15713593,13.623399652,14.666867736,15.262027141,14.048082756,13.864252441,13.328233957,11.957396549,12.081571437,8.0473630948,7.6403590732,7.5290228912,7.2384846098,7.7452340159,7.5987356726,7.6848172224,8.0367574251,7.8182977434,8.5612514842,5.3689485708,6.5167768566,6.094376761,7.4283831258,7.516793125,6.4493470834,6.1794352186,5.2914765315,4.1390988053,3.5203199533,0.3878247275,0.1419261747,0.263974888,0.5026725424,1.8819178157,1.3622383279,2.2317551386,1.6450729019,0.5748748341,0.6665694586,13.646582598,21.856630909,23.872511606,15.124858274,19.852601235,6.6515543352,-1.0106061,-4.956175048,-1.755981311,-0.09373633,14.034407325,21.998557084,24.136486494,15.627530817,21.73451905,8.0137926631,1.2211490381,-3.311102146,-1.181106477,0.5728331285 +050,2,4,38,017,North Dakota,Cass County,149778,149778,150321,153363,157534,163027,166792,171028,174562,178122,180861,182238,183904,543,3042,4171,5493,3765,4236,3534,3560,2739,1377,1666,540,2202,2355,2431,2502,2546,2628,2603,2478,2460,2446,254,889,829,951,1014,1071,1030,1102,1099,1202,1278,286,1313,1526,1480,1488,1475,1598,1501,1379,1258,1168,208,710,520,626,411,937,595,1221,456,284,225,52,1009,2061,3286,1816,1803,1333,836,900,-172,264,260,1719,2581,3912,2227,2740,1928,2057,1356,112,489,-3,10,64,101,50,21,8,2,4,7,9,5010,5011,5413,5492,5492,5612,5576,5562,5660,5691,5363,5373,14.501916466,15.149711962,15.167160072,15.171957953,15.073115861,15.208773402,14.761089247,13.805667678,13.550023547,13.360936467,5.85477009,5.3329559307,5.9333480991,6.1488270839,6.3406547866,5.9608206256,6.2492202652,6.1228526142,6.6207838634,6.9808981215,8.6471463758,9.8167560317,9.2338119734,9.0231308687,8.7324610739,9.2479527764,8.5118689819,7.6828150637,6.9292396839,6.3800383458,4.6759131202,3.3451593293,3.9056529023,2.4922760666,5.5473328992,3.4433866721,6.924045321,2.5405102749,1.5643116616,1.2290313594,6.6450652652,13.258410342,20.501558206,11.012100576,10.674323604,7.7143435863,4.7407877874,5.0141650162,-0.94740002,1.4420634617,11.320978385,16.603569671,24.407211108,13.504376643,16.221656503,11.157730258,11.664833108,7.554675291,0.6169116412,2.6710948211 +050,2,4,38,019,North Dakota,Cavalier County,3993,3994,3986,3944,3921,3854,3843,3824,3815,3787,3797,3734,3713,-8,-42,-23,-67,-11,-19,-9,-28,10,-63,-21,8,44,44,35,46,47,45,61,58,40,45,14,52,69,45,38,49,36,44,64,45,44,-6,-8,-25,-10,8,-2,9,17,-6,-5,1,0,-1,0,0,1,9,8,10,13,1,3,-1,-33,3,-57,-21,-26,-25,-55,3,-57,-26,-1,-34,3,-57,-20,-17,-17,-45,16,-56,-23,-1,0,-1,0,1,0,-1,0,0,-2,1,83,83,82,71,57,70,71,74,74,70,71,74,11.097099622,11.188811189,9.0032154341,11.952708848,12.260336507,11.781646812,16.048408314,15.29535865,10.622759262,12.085403518,13.114754098,17.546090273,11.575562701,9.8739768741,12.782052954,9.4253174499,11.575901079,16.877637131,11.950604169,11.816838996,-2.017654477,-6.357279085,-2.572347267,2.0787319735,-0.521716447,2.3563293625,4.4725072349,-1.582278481,-1.327844908,0.2685645226,-0.25220681,0,0,0.2598414967,2.347724012,2.0945149889,2.6308866088,3.4282700422,0.2655689815,0.8056935679,-8.322824716,0.7628734901,-14.66237942,-5.45667143,-6.782313812,-6.54535934,-14.46987635,0.7911392405,-15.13743195,-6.982677588,-8.575031526,0.7628734901,-14.66237942,-5.196829934,-4.4345898,-4.450844351,-11.83898974,4.2194092827,-14.87186297,-6.17698402 +050,2,4,38,021,North Dakota,Dickey County,5289,5287,5278,5253,5219,5194,5100,5052,4995,4834,4899,4851,4705,-9,-25,-34,-25,-94,-48,-57,-161,65,-48,-146,15,39,38,73,70,53,81,50,68,62,55,23,74,78,59,74,81,77,75,66,49,56,-8,-35,-40,14,-4,-28,4,-25,2,13,-1,1,1,0,2,2,14,9,10,2,1,2,-1,10,6,-42,-93,-34,-70,-147,61,-64,-146,0,11,6,-40,-91,-20,-61,-137,63,-63,-144,-1,-1,0,1,1,0,0,1,0,2,-1,299,301,306,298,275,251,204,174,147,205,212,186,7.4067040167,7.2574484339,14.020935369,13.60015543,10.441292356,16.124216184,10.173974972,13.97308127,12.717948718,11.511092507,14.053746083,14.896867838,11.33198886,14.377307169,15.957446809,15.327958595,15.260962458,13.562108291,10.051282051,11.720385098,-6.647042066,-7.639419404,2.6889465092,-0.777151739,-5.516154452,0.7962575893,-5.086987486,0.4109729785,2.6666666667,-0.209292591,0.1899154876,0,0.3841352156,0.3885758694,2.7580772262,1.791579576,2.0347949944,0.4109729785,0.2051282051,0.4185851821,1.8991548761,1.1459129106,-8.066839528,-18.06877793,-6.698187549,-13.93450781,-29.91148642,12.534675845,-13.12820513,-30.55671829,2.0890703637,1.1459129106,-7.682704312,-17.68020206,-3.940110323,-12.14292824,-27.87669142,12.945648824,-12.92307692,-30.13813311 +050,2,4,38,023,North Dakota,Divide County,2071,2071,2080,2143,2247,2326,2427,2457,2389,2287,2249,2244,2277,9,63,104,79,101,30,-68,-102,-38,-5,33,6,23,19,35,29,35,27,22,21,28,27,9,18,35,29,26,31,31,22,28,26,23,-3,5,-16,6,3,4,-4,0,-7,2,4,1,4,5,4,6,18,12,13,5,3,2,11,53,111,67,90,7,-76,-115,-37,-9,27,12,57,116,71,96,25,-64,-102,-32,-6,29,0,1,4,2,2,1,0,0,1,-1,0,66,66,67,64,67,70,70,70,71,66,65,62,10.892730287,8.6560364465,15.307238137,12.202819272,14.332514333,11.143210896,9.4097519247,9.2592592593,12.463832629,11.944260119,8.5247454416,15.945330296,12.683140171,10.940458658,12.694512695,12.794056954,9.4097519247,12.345679012,11.573558869,10.174740102,2.3679848449,-7.28929385,2.6240979663,1.2623606143,1.638001638,-1.650846059,0,-3.086419753,0.8902737592,1.7695200177,1.8943878759,2.277904328,1.7493986442,2.5247212287,7.371007371,4.9525381758,5.5603079555,2.2045855379,1.3354106388,0.8847600088,25.100639356,50.569476082,29.302427291,37.87081843,2.8665028665,-31.36607511,-49.18733961,-16.31393298,-4.006231916,11.944260119,26.995027232,52.84738041,31.051825935,40.395539659,10.237510238,-26.41353694,-43.62703165,-14.10934744,-2.670821278,12.829020128 +050,2,4,38,025,North Dakota,Dunn County,3536,3536,3536,3723,3957,4139,4372,4576,4364,4268,4302,4412,4465,0,187,234,182,233,204,-212,-96,34,110,53,11,39,45,49,59,91,62,61,68,78,72,19,40,35,44,22,38,35,34,36,23,23,-8,-1,10,5,37,53,27,27,32,55,49,6,16,7,2,8,13,10,17,5,3,3,2,170,207,170,182,136,-251,-142,-2,53,0,8,186,214,172,190,149,-241,-125,3,56,3,0,2,10,5,6,2,2,2,-1,-1,1,127,127,127,126,127,129,130,130,130,130,132,131,10.745281719,11.71875,12.104743083,13.864410763,20.339740724,13.870246085,14.133456905,15.869311552,17.902226303,16.221696519,11.020801763,9.1145833333,10.869565217,5.1697802843,8.4935181046,7.8299776286,7.8776645042,8.4014002334,5.278861602,5.1819308325,-0.275520044,2.6041666667,1.2351778656,8.6946304782,11.84622262,6.0402684564,6.2557924004,7.4679113186,12.6233647,11.039765687,4.4083207053,1.8229166667,0.4940711462,1.8799201034,2.9056772463,2.2371364653,3.9388322521,1.1668611435,0.6885471655,0.6759040216,46.838407494,53.90625,41.996047431,42.768182352,30.397854269,-56.15212528,-32.90083411,-0.466744457,12.164333257,0,51.246728199,55.729166667,42.490118577,44.648102456,33.303531515,-53.91498881,-28.96200185,0.7001166861,12.852880422,0.6759040216 +050,2,4,38,027,North Dakota,Eddy County,2385,2385,2386,2347,2350,2366,2330,2304,2299,2315,2274,2241,2179,1,-39,3,16,-36,-26,-5,16,-41,-33,-62,5,22,27,22,28,27,44,32,29,27,28,2,59,53,50,38,49,38,54,42,30,39,3,-37,-26,-28,-10,-22,6,-22,-13,-3,-11,0,0,1,0,0,1,0,0,0,0,0,-1,-3,28,44,-27,-6,-11,38,-27,-30,-50,-1,-3,29,44,-27,-5,-11,38,-27,-30,-50,-1,1,0,0,1,1,0,0,-1,0,-1,84,84,86,87,78,90,84,80,88,76,69,69,9.296429326,11.496700021,9.3299406277,11.925042589,11.652999568,19.117966544,13.870827915,12.638919154,11.96013289,12.669683258,24.931333192,22.567596338,21.204410517,16.183986371,21.148036254,16.510971106,23.407022107,18.304641534,13.289036545,17.647058824,-15.63490387,-11.07089632,-11.87446989,-4.258943782,-9.495036685,2.6069954378,-9.536194192,-5.66572238,-1.328903654,-4.977375566,0,0.4258037045,0,0,0.4315925766,0,0,0,0,0,-1.267694908,11.922503726,18.659881255,-11.49914821,-2.58955546,-4.779491636,16.471608149,-11.76726956,-13.28903654,-22.62443439,-1.267694908,12.34830743,18.659881255,-11.49914821,-2.157962883,-4.779491636,16.471608149,-11.76726956,-13.28903654,-22.62443439 +050,2,4,38,029,North Dakota,Emmons County,3550,3545,3531,3506,3471,3477,3412,3397,3330,3297,3261,3235,3187,-14,-25,-35,6,-65,-15,-67,-33,-36,-26,-48,7,26,27,26,32,33,27,31,27,35,29,24,57,47,43,56,41,53,48,38,42,49,-17,-31,-20,-17,-24,-8,-26,-17,-11,-7,-20,0,0,1,2,1,3,3,3,2,1,1,4,6,-18,22,-42,-10,-45,-18,-27,-20,-29,4,6,-17,24,-41,-7,-42,-15,-25,-19,-28,-1,0,2,-1,0,0,1,-1,0,0,0,53,53,54,55,54,52,54,53,50,55,52,49,7.3895125764,7.7397162104,7.4841681059,9.2901727391,9.6930533118,8.0273524602,9.355666214,8.2342177493,10.775862069,9.0314543756,16.200085264,13.472839329,12.377662637,16.257802294,12.042884418,15.75739557,14.486192847,11.588899055,12.931034483,15.2600436,-8.810572687,-5.733123119,-4.893494531,-6.967629554,-2.349831106,-7.73004311,-5.130526633,-3.354681305,-2.155172414,-6.228589225,0,0.2866561559,0.5757052389,0.2903178981,0.8811866647,0.8919280511,0.905387053,0.6099420555,0.3078817734,0.3114294612,1.705272133,-5.159810807,6.3327576281,-12.19335172,-2.937288882,-13.37892077,-5.432322318,-8.234217749,-6.157635468,-9.031454376,1.705272133,-4.873154651,6.908462867,-11.90303382,-2.056102218,-12.48699272,-4.526935265,-7.624275694,-5.849753695,-8.720024914 +050,2,4,38,031,North Dakota,Foster County,3343,3337,3343,3343,3380,3355,3337,3325,3308,3251,3212,3217,3165,6,0,37,-25,-18,-12,-17,-57,-39,5,-52,5,29,30,40,38,43,36,43,32,38,38,7,40,40,50,41,46,43,50,31,35,45,-2,-11,-10,-10,-3,-3,-7,-7,1,3,-7,1,5,2,0,0,-2,-2,-2,-2,-2,-2,6,6,46,-16,-14,-7,-9,-47,-39,5,-43,7,11,48,-16,-14,-9,-11,-49,-41,3,-45,1,0,-1,1,-1,0,1,-1,1,-1,0,61,61,64,64,49,49,49,55,55,55,55,55,8.6748429554,8.9245872378,11.878247958,11.356843993,12.909036325,10.854816825,13.111754841,9.9025220486,11.821434127,11.908492636,11.965300628,11.89944965,14.847809948,12.25343694,13.809666767,12.965475652,15.246226559,9.5930682346,10.888163011,14.102162332,-3.290457673,-2.974862413,-2.96956199,-0.896592947,-0.900630441,-2.110658827,-2.134471718,0.309453814,0.9332711153,-2.193669696,1.4956625785,0.5949724825,0,0,-0.600420294,-0.603045379,-0.609849062,-0.618907628,-0.622180744,-0.62676277,1.7947950942,13.684367098,-4.751299183,-4.184100418,-2.10147103,-2.713704206,-14.33145297,-12.06869875,1.5554518588,-13.47539956,3.2904576727,14.279339581,-4.751299183,-4.184100418,-2.701891324,-3.316749585,-14.94130203,-12.68760637,0.9332711153,-14.10216233 +050,2,4,38,033,North Dakota,Golden Valley County,1680,1680,1682,1758,1806,1825,1854,1881,1863,1780,1765,1762,1737,2,76,48,19,29,27,-18,-83,-15,-3,-25,5,22,20,17,28,23,28,18,29,18,21,9,13,22,23,25,15,13,13,13,7,7,-4,9,-2,-6,3,8,15,5,16,11,14,0,0,0,0,0,0,0,0,0,0,0,6,67,47,25,26,19,-34,-89,-31,-14,-38,6,67,47,25,26,19,-34,-89,-31,-14,-38,0,0,3,0,0,0,1,1,0,0,-1,52,52,52,52,52,52,52,52,52,52,52,52,12.790697674,11.223344557,9.3638116221,15.221527589,12.315930388,14.957264957,9.8819654131,16.361071932,10.206974766,12.003429551,7.5581395349,12.345679012,12.668686312,13.590649633,8.0321285141,6.9444444444,7.1369750206,7.3342736248,3.9693790757,4.0011431838,5.2325581395,-1.122334456,-3.30487469,1.630877956,4.2838018742,8.0128205128,2.7449903925,9.0267983075,6.2375956904,8.0022863675,0,0,0,0,0,0,0,0,0,0,38.953488372,26.374859708,13.770311209,14.134275618,10.174029451,-18.16239316,-48.86082899,-17.48942172,-7.938758151,-21.72049157,38.953488372,26.374859708,13.770311209,14.134275618,10.174029451,-18.16239316,-48.86082899,-17.48942172,-7.938758151,-21.72049157 +050,2,4,38,035,North Dakota,Grand Forks County,66861,66864,66994,66651,67651,69198,69865,70448,70666,70722,70675,69670,69481,130,-343,1000,1547,667,583,218,56,-47,-1005,-189,259,949,991,935,1014,1056,1061,1020,971,932,926,133,482,453,506,453,447,485,519,516,522,543,126,467,538,429,561,609,576,501,455,410,383,86,219,243,205,141,288,188,345,76,44,43,-77,-1036,222,889,-26,-309,-545,-794,-581,-1460,-615,9,-817,465,1094,115,-21,-357,-449,-505,-1416,-572,-5,7,-3,24,-9,-5,-1,4,3,1,0,4216,4216,4080,4121,4244,4213,4135,4044,3800,3498,2983,2964,14.201803285,14.757784694,13.664696125,14.583318352,15.052062175,15.037487422,14.428381475,13.734379089,13.281556165,13.309282722,7.2131392869,6.7459903799,7.3950120205,6.5150327549,6.3714695003,6.873875023,7.3414999859,7.2985989802,7.4388115002,7.8044714016,6.9886639979,8.0117943143,6.2696841044,8.0682855972,8.6805926749,8.1636123985,7.0868814892,6.4357801085,5.8427446649,5.5048113201,3.2773392196,3.6187100713,2.9960028937,2.0278578774,4.105107866,2.6645123801,4.8801878519,1.0749874467,0.6270262567,0.6180336469,-15.50375996,3.3059820405,12.992422305,-0.37393124,-4.404438648,-7.724251315,-11.2315048,-8.217996139,-20.80587125,-8.839318438,-12.22642074,6.9246921118,15.988425199,1.6539266376,-0.299330782,-5.059738934,-6.351316943,-7.143008692,-20.17884499,-8.221284791 +050,2,4,38,037,North Dakota,Grant County,2394,2394,2394,2358,2348,2393,2374,2396,2383,2361,2353,2272,2215,0,-36,-10,45,-19,22,-13,-22,-8,-81,-57,3,33,17,33,22,23,32,30,37,16,22,3,21,33,29,42,33,25,27,32,22,29,0,12,-16,4,-20,-10,7,3,5,-6,-7,0,2,3,3,2,1,0,0,0,0,0,0,-50,3,37,-1,31,-20,-26,-12,-74,-51,0,-48,6,40,1,32,-20,-26,-12,-74,-51,0,0,0,1,0,0,0,1,-1,-1,1,25,25,24,17,9,18,18,18,19,24,13,6,13.888888889,7.2248193795,13.921113689,9.2301237676,9.64360587,13.391922996,12.647554806,15.697921086,6.9189189189,9.80610653,8.8383838384,14.024649384,12.233705969,17.621145374,13.836477987,10.462439841,11.382799325,13.576580399,9.5135135135,12.926231335,5.0505050505,-6.799830004,1.6874077199,-8.391021607,-4.192872117,2.9294831555,1.2647554806,2.1213406873,-2.594594595,-3.120124805,0.8417508418,1.2749681258,1.2655557899,0.8391021607,0.4192872117,0,0,0,0,0,-21.04377104,1.2749681258,15.608521409,-0.41955108,12.997903564,-8.369951873,-10.96121417,-5.09121765,-32,-22.73233786,-20.2020202,2.5499362516,16.874077199,0.4195510803,13.417190776,-8.369951873,-10.96121417,-5.09121765,-32,-22.73233786 +050,2,4,38,039,North Dakota,Griggs County,2420,2421,2416,2370,2345,2284,2292,2288,2252,2243,2213,2218,2207,-5,-46,-25,-61,8,-4,-36,-9,-30,5,-11,10,20,16,19,19,26,13,20,20,25,21,12,39,36,45,40,43,40,39,30,34,34,-2,-19,-20,-26,-21,-17,-27,-19,-10,-9,-13,0,0,0,0,0,0,0,0,0,0,0,-2,-27,-5,-35,29,13,-9,11,-22,15,2,-2,-27,-5,-35,29,13,-9,11,-22,15,2,-1,0,0,0,0,0,0,-1,2,-1,0,47,47,46,45,44,46,46,45,44,40,40,38,8.3577099875,6.7868504772,8.2091164398,8.3041958042,11.35371179,5.7268722467,8.8987764182,8.9766606822,11.284134507,9.4915254237,16.297534476,15.270413574,19.4426442,17.482517483,18.777292576,17.621145374,17.352614016,13.464991023,15.346422929,15.367231638,-7.939824488,-8.483563097,-11.23352776,-9.178321678,-7.423580786,-11.89427313,-8.453837597,-4.488330341,-4.062288422,-5.875706215,0,0,0,0,0,0,0,0,0,0,-11.28290848,-2.120890774,-15.1220566,12.674825175,5.6768558952,-3.964757709,4.89432703,-9.87432675,6.7704807041,0.9039548023,-11.28290848,-2.120890774,-15.1220566,12.674825175,5.6768558952,-3.964757709,4.89432703,-9.87432675,6.7704807041,0.9039548023 +050,2,4,38,041,North Dakota,Hettinger County,2477,2478,2476,2504,2542,2644,2627,2658,2600,2480,2517,2521,2438,-2,28,38,102,-17,31,-58,-120,37,4,-83,9,26,28,31,37,31,38,34,40,31,32,11,44,39,37,41,25,32,25,27,26,24,-2,-18,-11,-6,-4,6,6,9,13,5,8,0,0,0,0,0,1,0,0,0,0,0,0,44,49,105,-11,24,-63,-131,25,-1,-90,0,44,49,105,-11,25,-63,-131,25,-1,-90,0,2,0,3,-2,0,-1,2,-1,0,-1,169,169,163,166,168,168,183,171,164,163,164,132,10.441767068,11.097899326,11.955264173,14.039081768,11.731315043,14.454165082,13.385826772,16.009605763,12.306470822,12.905827788,17.670682731,15.457788347,14.269186271,15.556820338,9.4607379376,12.17192849,9.842519685,10.80648389,10.321556173,9.6793708409,-7.228915663,-4.359889021,-2.313922098,-1.51773857,2.270577105,2.2822365919,3.5433070866,5.2031218731,1.9849146487,3.226456947,0,0,0,0,0.3784295175,0,0,0,0,0,17.670682731,19.421323821,40.493636714,-4.173781066,9.0823084201,-23.96348421,-51.57480315,10.006003602,-0.39698293,-36.29764065,17.670682731,19.421323821,40.493636714,-4.173781066,9.4607379376,-23.96348421,-51.57480315,10.006003602,-0.39698293,-36.29764065 +050,2,4,38,043,North Dakota,Kidder County,2435,2435,2447,2442,2447,2445,2449,2451,2472,2477,2453,2481,2458,12,-5,5,-2,4,2,21,5,-24,28,-23,0,38,21,25,36,31,24,34,27,29,27,0,24,18,19,15,20,12,27,18,15,18,0,14,3,6,21,11,12,7,9,14,9,0,0,0,0,0,3,1,-2,5,1,1,11,-19,3,-7,-18,-12,10,0,-38,13,-33,11,-19,3,-7,-18,-9,11,-2,-33,14,-32,1,0,-1,-1,1,0,-2,0,0,0,0,0,5,0,0,0,0,0,0,0,0,0,0,15.545101248,8.5907138474,10.220768602,14.711892113,12.653061224,9.7501523461,13.740149525,10.953346856,11.755168221,10.933387325,9.8179586828,7.3634690121,7.7677841374,6.129955047,8.1632653061,4.8750761731,10.911295211,7.3022312373,6.0802594244,7.2889248836,5.7271425649,1.2272448353,2.4529844644,8.5819370658,4.4897959184,4.8750761731,2.828854314,3.6511156187,5.6749087961,3.6444624418,0,0,0,0,1.2244897959,0.4062563478,-0.80824409,2.0283975659,0.4053506283,0.4049402713,-7.772550624,1.2272448353,-2.861815209,-7.355946056,-4.897959184,4.0625634776,0,-15.4158215,5.2695581678,-13.36302895,-7.772550624,1.2272448353,-2.861815209,-7.355946056,-3.673469388,4.4688198253,-0.80824409,-13.38742394,5.6749087961,-12.95808868 +050,2,4,38,045,North Dakota,LaMoure County,4139,4141,4130,4095,4085,4101,4096,4136,4116,4106,4079,4049,4033,-11,-35,-10,16,-5,40,-20,-10,-27,-30,-16,8,31,30,47,40,56,47,48,45,55,49,17,50,41,39,46,42,49,43,33,42,41,-9,-19,-11,8,-6,14,-2,5,12,13,8,0,0,0,0,0,0,5,12,5,5,5,-2,-16,0,10,1,28,-23,-27,-43,-49,-27,-2,-16,0,10,1,28,-18,-15,-38,-44,-22,0,0,1,-2,0,-2,0,0,-1,1,-2,65,65,62,61,65,64,66,65,63,66,58,58,7.537993921,7.3349633252,11.48301979,9.7596681713,13.605442177,11.391177896,11.675991243,10.995723885,13.533464567,12.125711458,12.158054711,10.024449878,9.5284632299,11.223618397,10.204081633,11.875908871,10.459742155,8.0635308491,10.334645669,10.146003464,-4.62006079,-2.689486553,1.95455656,-1.463950226,3.4013605442,-0.484730974,1.2162490878,2.932193036,3.1988188976,1.9797079931,0,0,0,0,0,1.2118274358,2.9189978108,1.2217470984,1.2303149606,1.2373174957,-3.890577508,0,2.4431957,0.2439917043,6.8027210884,-5.574406205,-6.567745074,-10.50702505,-12.05708661,-6.681514477,-3.890577508,0,2.4431957,0.2439917043,6.8027210884,-4.362578769,-3.648747263,-9.285277947,-10.82677165,-5.444196981 +050,2,4,38,047,North Dakota,Logan County,1990,1988,1998,1972,1941,1932,1941,1927,1924,1912,1887,1851,1880,10,-26,-31,-9,9,-14,-3,-12,-25,-36,29,3,20,22,16,19,25,17,23,32,21,26,2,28,29,27,30,29,28,28,30,19,18,1,-8,-7,-11,-11,-4,-11,-5,2,2,8,0,1,1,1,2,6,4,4,3,2,0,9,-18,-27,2,18,-15,5,-11,-31,-39,21,9,-17,-26,3,20,-9,9,-7,-28,-37,21,0,-1,2,-1,0,-1,-1,0,1,-1,0,72,72,72,69,69,69,69,64,66,53,53,53,10.075566751,11.244569384,8.262328944,9.811515621,12.926577042,8.8288756167,11.991657977,16.846538563,11.235955056,13.93728223,14.105793451,14.822386915,13.942680093,15.49186677,14.994829369,14.541677486,14.598540146,15.793629903,10.165864098,9.6488876977,-4.0302267,-3.577817531,-5.680351149,-5.680351149,-2.068252327,-5.71280187,-2.606882169,1.0529086602,1.0700909577,4.2883945323,0.5037783375,0.5111167902,0.516395559,1.032791118,3.1023784902,2.0773824981,2.0855057351,1.5793629903,1.0700909577,0,-9.068010076,-13.80015334,1.032791118,9.295120062,-7.755946225,2.5967281226,-5.735140772,-16.32008423,-20.86677368,11.257035647,-8.564231738,-13.28903654,1.549186677,10.32791118,-4.653567735,4.6741106206,-3.649635036,-14.74072124,-19.79668272,11.257035647 +050,2,4,38,049,North Dakota,McHenry County,5395,5392,5402,5501,5798,5906,5976,5975,5981,5894,5802,5753,5695,10,99,297,108,70,-1,6,-87,-92,-49,-58,14,57,66,86,64,66,78,70,72,60,62,4,61,56,71,67,69,55,63,78,46,56,10,-4,10,15,-3,-3,23,7,-6,14,6,0,3,2,1,-1,0,1,2,1,1,1,1,98,275,91,73,2,-18,-97,-87,-64,-64,1,101,277,92,72,2,-17,-95,-86,-63,-63,-1,2,10,1,1,0,0,1,0,0,-1,48,48,44,54,53,47,49,50,51,46,45,44,10.455837843,11.682449774,14.695830485,10.772597206,11.045100828,13.047842088,11.789473684,12.311901505,10.385114669,10.831586303,11.189580849,9.9123816267,12.132604238,11.2775627,11.547150866,9.2004014721,10.610526316,13.337893297,7.9619212462,9.7833682739,-0.733743007,1.7700681476,2.5632262474,-0.504965494,-0.502050038,3.8474406156,1.1789473684,-1.025991792,2.4231934228,1.0482180294,0.5503072549,0.3540136295,0.1708817498,-0.168321831,0,0.1672800268,0.3368421053,0.170998632,0.1730852445,0.1747030049,17.97670366,48.67687406,15.550239234,12.287493688,0.3347000251,-3.011040482,-16.33684211,-14.87688098,-11.07745565,-11.18099231,18.527010914,49.030887689,15.721120984,12.119171857,0.3347000251,-2.843760455,-16,-14.70588235,-10.9043704,-11.00628931 +050,2,4,38,051,North Dakota,McIntosh County,2809,2813,2800,2758,2750,2737,2744,2716,2600,2607,2556,2473,2440,-13,-42,-8,-13,7,-28,-116,7,-51,-83,-33,2,24,22,29,24,30,25,19,29,24,26,7,54,55,59,52,50,47,38,62,47,47,-5,-30,-33,-30,-28,-20,-22,-19,-33,-23,-21,0,1,3,1,0,0,0,0,0,0,0,-8,-14,21,15,35,-8,-94,25,-18,-59,-13,-8,-13,24,16,35,-8,-94,25,-18,-59,-13,0,1,1,1,0,0,0,1,0,-1,1,103,103,102,99,97,94,98,92,101,93,92,93,8.636200072,7.9883805374,10.57043922,8.7575259989,10.989010989,9.4055680963,7.2978682543,11.233778811,9.5446410817,10.584164462,19.431450162,19.970951344,21.505376344,18.974639664,18.315018315,17.682468021,14.595736509,24.017044354,18.691588785,19.132912681,-10.79525009,-11.98257081,-10.93493712,-10.21711367,-7.326007326,-8.276899925,-7.297868254,-12.78326554,-9.146947703,-8.548748219,0.3598416697,1.0893246187,0.3644979041,0,0,0,0,0,0,0,-5.037783375,7.6252723312,5.4674685621,12.771392082,-2.93040293,-35.36493604,9.6024582293,-6.972690296,-23.46390933,-5.292082231,-4.677941706,8.7145969499,5.8319664662,12.771392082,-2.93040293,-35.36493604,9.6024582293,-6.972690296,-23.46390933,-5.292082231 +050,2,4,38,053,North Dakota,McKenzie County,6360,6359,6412,7018,7989,9295,10997,12817,12604,12715,13581,15038,15242,53,606,971,1306,1702,1820,-213,111,866,1457,204,10,90,103,155,188,236,248,232,246,267,288,2,55,69,73,61,52,80,65,60,53,79,8,35,34,82,127,184,168,167,186,214,209,3,1,1,3,0,8,-7,0,-6,-6,-4,40,565,897,1177,1520,1597,-379,-56,683,1253,-2,43,566,898,1180,1520,1605,-386,-56,677,1247,-6,2,5,39,44,55,31,5,0,3,-4,1,152,152,153,153,150,148,156,153,149,148,148,149,13.402829486,13.726927434,17.935663041,18.529469742,19.820273789,19.51142756,18.326158221,18.710069973,18.658932877,19.022457067,8.1906180194,9.1957086693,8.4471187225,6.0122215651,4.3671789704,6.2940088903,5.1344839844,4.5634317006,3.7038331179,5.2179656539,5.2122114669,4.5312187646,9.4885443184,12.517248177,15.453094818,13.21741867,13.191674237,14.146638272,14.955099759,13.804491413,0.1489203276,0.1332711401,0.3471418653,0,0.6718736877,-0.550725778,0,-0.45634317,-0.419301862,-0.264200793,84.139985108,119.5442127,136.19532516,149.81273408,134.12278492,-29.81786712,-4.423555433,51.947064192,87.564205598,-0.132100396,84.288905436,119.67748384,136.54246702,149.81273408,134.7946586,-30.3685929,-4.423555433,51.490721022,87.144903735,-0.396301189 +050,2,4,38,055,North Dakota,McLean County,8962,8962,8998,9082,9388,9466,9553,9664,9650,9638,9510,9440,9416,36,84,306,78,87,111,-14,-12,-128,-70,-24,24,107,135,93,118,122,122,120,105,116,104,22,112,122,123,95,94,95,123,123,95,107,2,-5,13,-30,23,28,27,-3,-18,21,-3,1,7,6,4,1,1,1,2,1,1,1,32,81,279,101,63,81,-41,-10,-111,-92,-21,33,88,285,105,64,82,-40,-8,-110,-91,-20,1,1,8,3,0,1,-1,-1,0,0,-1,196,196,199,191,148,150,148,147,145,136,146,147,11.836283186,14.618299946,9.8652805771,12.408643988,12.697091117,12.633322978,12.442969722,10.967202841,12.242744063,11.030971574,12.389380531,13.210611803,13.04762915,9.99000999,9.7830046313,9.8374236305,12.754043965,12.847294757,10.026385224,11.349172677,-0.553097345,1.4076881429,-3.182348573,2.4186339976,2.9140864859,2.7958993476,-0.311074243,-1.880091916,2.2163588391,-0.318201103,0.7743362832,0.6497022198,0.4243131431,0.1051579999,0.1040745174,0.1035518277,0.2073828287,0.1044495509,0.1055408971,0.1060670344,8.9601769912,30.211153221,10.713906863,6.6249539934,8.4300359057,-4.245624935,-1.036914144,-11.59390015,-9.709762533,-2.227407722,9.7345132743,30.860855441,11.138220006,6.7301119933,8.5341104231,-4.142073108,-0.829531315,-11.4894506,-9.604221636,-2.121340687 +050,2,4,38,057,North Dakota,Mercer County,8424,8424,8418,8424,8474,8589,8712,8790,8634,8470,8291,8228,8174,-6,6,50,115,123,78,-156,-164,-179,-63,-54,31,97,102,97,108,98,110,90,101,90,88,29,71,76,80,90,87,87,73,79,72,85,2,26,26,17,18,11,23,17,22,18,3,0,5,4,5,0,1,0,5,1,-1,1,-8,-26,17,92,107,65,-178,-188,-202,-82,-57,-8,-21,21,97,107,66,-178,-183,-201,-83,-56,0,1,3,1,-2,1,-1,2,0,2,-1,126,126,125,126,126,127,125,125,123,121,125,125,11.518821993,12.072434608,11.369630194,12.484827467,11.198720146,12.626262626,10.523854069,12.051786886,10.896543374,10.730398732,8.4313026956,8.9951473547,9.377014593,10.404022889,9.9417209462,9.9862258953,8.5360149673,9.4266451882,8.7172346994,10.364589684,3.087519297,3.0772872529,1.992615601,2.0808045778,1.2569992001,2.6400367309,1.987839102,2.625141698,2.1793086749,0.3658090477,0.593753711,0.4734288081,0.5860634121,0,0.1142726546,0,0.5846585594,0.1193246226,-0.121072704,0.1219363492,-3.087519297,2.0120724346,10.783566782,12.369227212,7.427722546,-20.43158861,-21.98316183,-24.10357377,-9.927961741,-6.950371906,-2.493765586,2.4855012428,11.369630194,12.369227212,7.5419952005,-20.43158861,-21.39850327,-23.98424915,-10.04903445,-6.828435557 +050,2,4,38,059,North Dakota,Morton County,27471,27469,27570,27725,28092,28939,29792,30273,30775,30971,31041,31301,31503,101,155,367,847,853,481,502,196,70,260,202,102,375,396,437,446,475,524,505,419,442,441,87,249,268,260,271,285,263,325,310,311,309,15,126,128,177,175,190,261,180,109,131,132,1,2,-3,-6,15,64,72,83,110,3,26,79,29,231,653,644,226,168,-64,-149,125,43,80,31,228,647,659,290,240,19,-39,128,69,6,-2,11,23,19,1,1,-3,0,1,1,597,598,617,617,630,645,640,627,661,819,809,797,13.563613347,14.189225505,15.324998685,15.187890552,15.816199118,17.166819552,16.357334888,13.513513514,14.179846652,14.043691485,9.0062392621,9.60280918,9.1178481878,9.2285164564,9.4897194706,8.6161708819,10.5269977,9.9980648907,9.9772224183,9.8401375709,4.5573740845,4.5864163248,6.2071504971,5.9593740955,6.326479647,8.5506486699,5.8303371878,3.5154486228,4.2026242341,4.2035539138,0.0723392712,-0.107494133,-0.210411881,0.5108034939,2.1310247232,2.3587996331,2.6884332588,3.5477004451,0.0962433031,0.8279727406,1.0489194321,8.2770482111,22.89982641,21.930496671,7.5251810539,5.5038658105,-2.073008778,-4.805521512,4.0101376279,1.3693395325,1.1212587033,8.1695540785,22.689414529,22.441300165,9.6562057771,7.8626654436,0.6154244809,-1.257821067,4.106380931,2.1973122731 +050,2,4,38,061,North Dakota,Mountrail County,7673,7663,7708,8102,8739,9342,9755,10311,10239,10273,10217,10507,10502,45,394,637,603,413,556,-72,34,-56,290,-5,28,135,151,159,160,150,181,186,203,177,193,29,75,83,74,74,94,94,89,104,78,91,-1,60,68,85,86,56,87,97,99,99,102,0,0,-1,1,1,22,20,22,19,13,8,42,331,545,499,313,469,-181,-88,-174,180,-114,42,331,544,500,314,491,-161,-66,-155,193,-106,4,3,25,18,13,9,2,3,0,-2,-1,564,564,565,566,558,557,555,558,547,539,526,542,17.077798861,17.932426816,17.587522814,16.756558622,14.950662813,17.615571776,18.135725429,19.81454368,17.08164447,18.373078205,9.4876660342,9.8568968589,8.1853879763,7.7499083626,9.3690820293,9.1484184915,8.6778471139,10.151293314,7.5275043428,8.6629539721,7.5901328273,8.0755299567,9.4021348377,9.0066502592,5.5815807834,8.4671532847,9.4578783151,9.663250366,9.5541401274,9.7101242325,0,-0.118757793,0.110613351,0.1047284914,2.1927638792,1.9464720195,2.1450858034,1.8545632016,1.2545840571,0.7615783712,41.872232764,64.722997447,55.196062165,32.780017804,46.745739061,-17.61557178,-8.580343214,-16.98389458,17.371163868,-10.85249179,41.872232764,64.604239653,55.306675516,32.884746295,48.93850294,-15.66909976,-6.43525741,-15.12933138,18.625747925,-10.09091342 +050,2,4,38,063,North Dakota,Nelson County,3126,3126,3121,3059,3055,3054,3017,2916,2887,2905,2881,2856,2789,-5,-62,-4,-1,-37,-101,-29,18,-24,-25,-67,8,32,29,35,38,26,25,30,23,26,24,19,69,64,46,58,68,49,66,45,56,48,-11,-37,-35,-11,-20,-42,-24,-36,-22,-30,-24,0,1,1,4,1,4,12,-1,21,9,4,6,-25,30,7,-19,-62,-17,54,-22,-2,-47,6,-24,31,11,-18,-58,-5,53,-1,7,-43,0,-1,0,-1,1,-1,0,1,-1,-2,0,80,80,80,80,80,80,79,80,79,79,77,79,10.355987055,9.4864245993,11.458503847,12.51853072,8.7645373336,8.6162329829,10.359116022,7.9502246803,9.0639707164,8.5031000886,22.330097087,20.935557736,15.059747913,19.107231099,22.922636103,16.887816647,22.790055249,15.554787418,19.522398466,17.006200177,-11.97411003,-11.44913314,-3.601244066,-6.588700379,-14.15809877,-8.271583664,-12.43093923,-7.604562738,-10.45842775,-8.503100089,0.3236245955,0.3271180896,1.3095432968,0.3294350189,1.348390359,4.1357918318,-0.345303867,7.258900795,3.1375283249,1.4171833481,-8.090614887,9.8135426889,2.2917007694,-6.25926536,-20.90005056,-5.859038428,18.64640884,-7.604562738,-0.697228517,-16.65190434,-7.766990291,10.140660779,3.6012440661,-5.929830341,-19.55166021,-1.723246597,18.301104972,-0.345661943,2.4402998083,-15.23472099 +050,2,4,38,065,North Dakota,Oliver County,1846,1848,1841,1849,1849,1891,1870,1866,1896,1932,1950,1951,1926,-7,8,0,42,-21,-4,30,36,18,1,-25,6,18,20,18,28,19,25,21,29,18,23,7,10,13,10,18,12,17,8,11,10,5,-1,8,7,8,10,7,8,13,18,8,18,0,-1,0,0,0,0,0,0,0,0,0,-7,2,-8,32,-29,-11,21,24,-1,-6,-43,-7,1,-8,32,-29,-11,21,24,-1,-6,-43,1,-1,1,2,-2,0,1,-1,1,-1,0,2,2,2,2,2,2,2,2,2,2,2,2,9.756097561,10.816657653,9.6256684492,14.889657006,10.17130621,13.290802764,10.971786834,14.94075219,9.2284029736,11.864843952,5.4200542005,7.0308274743,5.3475935829,9.5719223611,6.4239828694,9.0377458799,4.1797283177,5.667181865,5.1268905409,2.5793139025,4.3360433604,3.7858301785,4.2780748663,5.317734645,3.7473233405,4.2530568846,6.7920585162,9.2735703246,4.1015124327,9.285530049,-0.54200542,0,0,0,0,0,0,0,0,0,1.0840108401,-4.326663061,17.112299465,-15.42143047,-5.888650964,11.164274322,12.539184953,-0.515198351,-3.076134325,-22.18209956,0.5420054201,-4.326663061,17.112299465,-15.42143047,-5.888650964,11.164274322,12.539184953,-0.515198351,-3.076134325,-22.18209956 +050,2,4,38,067,North Dakota,Pembina County,7413,7403,7402,7355,7221,7099,7067,7033,7043,6936,6857,6754,6658,-1,-47,-134,-122,-32,-34,10,-107,-79,-103,-96,14,88,73,71,83,87,77,95,80,54,61,26,80,83,96,92,77,61,84,91,80,89,-12,8,-10,-25,-9,10,16,11,-11,-26,-28,2,7,9,6,14,28,17,6,1,1,1,11,-62,-137,-105,-36,-73,-22,-124,-70,-76,-69,13,-55,-128,-99,-22,-45,-5,-118,-69,-75,-68,-2,0,4,2,-1,1,-1,0,1,-2,0,149,155,150,148,146,150,145,152,145,149,148,146,11.926543335,10.016465423,9.9162011173,11.718198503,12.340425532,10.940608127,13.591816296,11.600087001,7.9347586511,9.0963316433,10.842312123,11.388583974,13.407821229,12.988846534,10.921985816,8.6672350099,12.018027041,13.195098963,11.755198002,13.271696988,1.0842312123,-1.372118551,-3.491620112,-1.27064803,1.4184397163,2.2733731174,1.5737892553,-1.595011963,-3.820439351,-4.175365344,0.9487023108,1.2349066959,0.8379888268,1.976563603,3.9716312057,2.4154589372,0.8584305029,0.1450010875,0.146939975,0.1491201909,-8.402791895,-18.79802415,-14.66480447,-5.082592122,-10.35460993,-3.125888036,-17.74089706,-10.15007613,-11.1674381,-10.28929317,-7.454089585,-17.56311745,-13.82681564,-3.106028519,-6.382978723,-0.710429099,-16.88246656,-10.00507504,-11.02049813,-10.14017298 +050,2,4,38,069,North Dakota,Pierce County,4357,4359,4360,4368,4444,4415,4360,4269,4209,4098,4072,3997,3928,1,8,76,-29,-55,-91,-60,-111,-26,-75,-69,4,41,49,55,51,49,42,35,45,38,35,7,66,76,68,68,64,57,52,57,39,50,-3,-25,-27,-13,-17,-15,-15,-17,-12,-1,-15,0,0,0,0,0,0,3,16,6,4,2,4,33,101,-15,-38,-76,-49,-111,-20,-77,-55,4,33,101,-15,-38,-76,-46,-95,-14,-73,-53,0,0,2,-1,0,0,1,1,0,-1,-1,261,261,263,269,261,257,240,232,227,232,229,238,9.3950504125,11.121198366,12.416751326,11.623931624,11.357051802,9.9079971691,8.4266281449,11.015911873,9.4187631677,8.832807571,15.123739688,17.249205629,15.351619822,15.498575499,14.833700313,13.446567587,12.519561815,13.953488372,9.6666253563,12.61829653,-5.728689276,-6.128007263,-2.934868495,-3.874643875,-3.476648511,-3.538570418,-4.09293367,-2.937576499,-0.247862189,-3.785488959,0,0,0,0,0,0.7077140835,3.8521728663,1.4687882497,0.9914487545,0.5047318612,7.5618698442,22.923286428,-3.386386725,-8.660968661,-17.61501912,-11.55933003,-26.72444926,-4.895960832,-19.08538852,-13.88012618,7.5618698442,22.923286428,-3.386386725,-8.660968661,-17.61501912,-10.85161595,-22.87227639,-3.427172583,-18.09393977,-13.37539432 +050,2,4,38,071,North Dakota,Ramsey County,11451,11451,11451,11524,11588,11584,11619,11667,11561,11594,11574,11488,11388,0,73,64,-4,35,48,-106,33,-20,-86,-100,39,186,154,149,158,172,157,156,180,160,160,50,133,148,105,141,158,113,141,126,138,134,-11,53,6,44,17,14,44,15,54,22,26,1,9,10,10,0,17,21,44,17,14,11,10,12,48,-59,21,18,-170,-27,-91,-120,-135,11,21,58,-49,21,35,-149,17,-74,-106,-124,0,-1,0,1,-3,-1,-1,1,0,-2,-2,492,492,497,500,486,466,472,455,435,434,447,425,16.191512514,13.326410523,12.860348697,13.618928587,14.772824873,13.518167729,13.474411574,15.538674033,13.87563958,13.988459521,11.577801959,12.807199723,9.0626618332,12.153600827,13.570385639,9.7296366454,12.178795077,10.877071823,11.967739138,11.715334849,4.613710555,0.5192107996,3.7976868635,1.4653277593,1.2024392339,3.7885310832,1.2956164975,4.6616022099,1.9079004423,2.2731246721,0.7834602829,0.8653513326,0.8631106508,0,1.460104784,1.8081625624,3.8004750594,1.4675414365,1.2141184633,0.9617065921,1.0446137106,4.1536863967,-5.09235284,1.8101107615,1.5459933007,-14.63750646,-2.332109696,-7.855662983,-10.40672969,-11.80276272,1.8280739935,5.0190377293,-4.229242189,1.8101107615,3.0060980847,-12.8293439,1.4683653639,-6.388121547,-9.192611222,-10.84105613 +050,2,4,38,073,North Dakota,Ransom County,5457,5457,5440,5432,5472,5498,5446,5455,5379,5301,5218,5217,5173,-17,-8,40,26,-52,9,-76,-78,-83,-1,-44,8,62,75,61,70,59,62,61,37,53,51,5,83,83,70,78,81,90,87,71,83,79,3,-21,-8,-9,-8,-22,-28,-26,-34,-30,-28,0,0,1,3,1,4,3,5,0,0,0,-21,12,49,32,-46,27,-52,-56,-49,29,-16,-21,12,50,35,-45,31,-49,-51,-49,29,-16,1,1,-2,0,1,0,1,-1,0,0,0,185,185,178,199,183,181,182,181,167,151,155,139,11.40544518,13.756419663,11.121239745,12.792397661,10.824694982,11.445449511,11.423220974,7.034889248,10.158121706,9.8171318576,15.268579838,15.223771093,12.762078396,14.254385965,14.861021925,16.614362193,16.292134831,13.499382071,15.908001917,15.20692974,-3.863134658,-1.467351431,-1.640838651,-1.461988304,-4.036326942,-5.168912682,-4.868913858,-6.464492823,-5.749880211,-5.389797883,0,0.1834189288,0.546946217,0.182748538,0.7338776259,0.5538120731,0.936329588,0,0,0,2.2075055188,8.9875275128,5.8340929809,-8.406432749,4.9536739749,-9.599409267,-10.48689139,-9.31647495,5.5582175371,-3.079884504,2.2075055188,9.1709464417,6.3810391978,-8.223684211,5.6875516008,-9.045597194,-9.550561798,-9.31647495,5.5582175371,-3.079884504 +050,2,4,38,075,North Dakota,Renville County,2470,2470,2484,2498,2556,2612,2572,2550,2525,2454,2349,2324,2283,14,14,58,56,-40,-22,-25,-71,-105,-25,-41,10,22,31,38,29,30,39,30,22,16,21,1,18,32,34,31,27,29,35,31,25,24,9,4,-1,4,-2,3,10,-5,-9,-9,-3,1,3,0,0,0,0,0,0,0,0,0,3,8,56,51,-38,-24,-36,-66,-95,-17,-38,4,11,56,51,-38,-24,-36,-66,-95,-17,-38,1,-1,3,1,0,-1,1,0,-1,1,0,54,54,52,53,53,55,52,54,54,54,54,54,8.8317944601,12.267510882,14.705882353,11.188271605,11.714174151,15.369458128,12.050612573,9.1609410785,6.8478493473,9.1165617539,7.2260136491,12.66323704,13.157894737,11.959876543,10.542756736,11.428571429,14.059048002,12.908598792,10.699764605,10.418927719,1.6057808109,-0.395726157,1.5479876161,-0.771604938,1.1714174151,3.9408866995,-2.008435429,-3.747657714,-3.851915258,-1.302365965,1.2043356082,0,0,0,0,0,0,0,0,0,3.2115616218,22.16066482,19.736842105,-14.66049383,-9.371339321,-14.18719212,-26.51134766,-39.5586092,-7.275839932,-16.49663555,4.41589723,22.16066482,19.736842105,-14.66049383,-9.371339321,-14.18719212,-26.51134766,-39.5586092,-7.275839932,-16.49663555 +050,2,4,38,077,North Dakota,Richland County,16321,16321,16329,16269,16231,16301,16363,16306,16316,16323,16245,16187,16156,8,-60,-38,70,62,-57,10,7,-78,-58,-31,56,143,146,180,185,193,193,208,187,195,189,52,143,107,130,135,160,137,142,146,140,151,4,0,39,50,50,33,56,66,41,55,38,4,3,-1,0,-3,3,3,13,2,0,0,2,-62,-76,19,19,-92,-48,-72,-121,-113,-70,6,-59,-77,19,16,-89,-45,-59,-119,-113,-70,-2,-1,0,1,-4,-1,-1,0,0,0,1,986,986,1044,1081,1030,1052,1034,973,1013,971,882,909,8.7735443892,8.9846153846,11.066027296,11.327455302,11.815482568,11.832505671,12.745488526,11.483664947,12.025160335,11.68722753,8.7735443892,6.5846153846,7.992130825,8.2659808964,9.7952187089,8.3992397768,8.7012469745,8.965856055,8.633448446,9.3374145874,0,2.4,3.0738964712,3.0614744061,2.0202638587,3.4332658942,4.0442415515,2.5178088922,3.3917118895,2.3498129425,0.1840603718,-0.061538462,0,-0.183688464,0.1836603508,0.1839249586,0.7965930329,0.122819946,0,0,-3.803914351,-4.676923077,1.168080659,1.1633602743,-5.632250758,-2.942799338,-4.411899874,-7.430606731,-6.968426246,-4.328602789,-3.619853979,-4.738461538,1.168080659,0.9796718099,-5.448590407,-2.758874379,-3.615306842,-7.307786785,-6.968426246,-4.328602789 +050,2,4,38,079,North Dakota,Rolette County,13937,13939,14009,14195,14406,14683,14738,14707,14732,14622,14396,14271,14165,70,186,211,277,55,-31,25,-110,-226,-125,-106,83,302,297,320,304,287,282,245,241,233,218,21,141,125,147,138,140,122,147,137,157,187,62,161,172,173,166,147,160,98,104,76,31,3,3,1,1,1,0,1,1,1,0,0,6,22,41,103,-112,-180,-136,-209,-332,-203,-136,9,25,42,104,-111,-180,-135,-208,-331,-203,-136,-1,0,-3,0,0,2,0,0,1,2,-1,122,122,122,117,119,122,122,123,122,122,122,123,21.415402071,20.768504598,22.001443845,20.66551103,19.493971812,19.158259452,16.692784629,16.610379764,16.255624935,15.332676888,9.9985817615,8.7409531135,10.106913266,9.3810543489,9.5092545424,8.288325011,10.015670777,9.4424150527,10.953361007,13.152342102,11.416820309,12.027551484,11.894530579,11.284456681,9.9847172695,10.869934441,6.6771138516,7.1679647116,5.3022639272,2.1803347869,0.2127357822,0.0699276249,0.068754512,0.0679786547,0,0.0679370903,0.0681338148,0.0689227376,0,0,1.5600624025,2.8670326212,7.0817147375,-7.613609327,-12.22618441,-9.239444275,-14.2399673,-22.88234889,-14.16262602,-9.56533971,1.7727981847,2.9369602461,7.1504692495,-7.545630672,-12.22618441,-9.171507184,-14.17183348,-22.81342615,-14.16262602,-9.56533971 +050,2,4,38,081,North Dakota,Sargent County,3829,3829,3812,3791,3895,3882,3924,3871,3892,3870,3872,3950,3913,-17,-21,104,-13,42,-53,21,-22,2,78,-37,8,32,31,42,39,43,44,48,39,47,49,3,32,35,36,38,39,29,37,37,27,39,5,0,-4,6,1,4,15,11,2,20,10,0,2,2,4,6,9,9,18,9,8,6,-24,-22,104,-24,37,-67,-3,-51,-8,50,-53,-24,-20,106,-20,43,-58,6,-33,1,58,-47,2,-1,2,1,-2,1,0,0,-1,0,0,37,37,32,36,38,38,39,38,39,39,38,38,8.4177298435,8.066614624,10.801080108,9.9923136049,11.032713278,11.335823779,12.367946406,10.074916042,12.017386858,12.463436347,8.4177298435,9.1074681239,9.258068664,9.7361004356,10.006414368,7.4713384001,9.5336253543,9.5582536812,6.9036052161,9.9198779092,0,-1.0408535,1.543011444,0.2562131694,1.0262989096,3.8644853794,2.8343210513,0.5166623611,5.1137816415,2.5435584383,0.5261081152,0.5204267499,1.028674296,1.5372790161,2.3091725465,2.3186912276,4.6379799021,2.3249806252,2.0455126566,1.526135063,-5.787189267,27.062190997,-6.172045776,9.4798872662,-17.19050674,-0.772897076,-13.14094306,-2.066649445,12.784454104,-13.48085972,-5.261081152,27.582617747,-5.14337148,11.017166282,-14.88133419,1.5457941517,-8.502963154,0.2583311806,14.82996676,-11.95472466 +050,2,4,38,083,North Dakota,Sheridan County,1321,1321,1316,1316,1284,1327,1334,1311,1344,1352,1336,1295,1275,-5,0,-32,43,7,-23,33,8,-16,-41,-20,4,11,12,13,7,13,15,16,16,10,12,4,12,14,9,11,15,6,14,7,6,8,0,-1,-2,4,-4,-2,9,2,9,4,4,0,0,0,0,0,0,0,0,0,0,0,-6,1,-29,38,10,-22,25,7,-25,-45,-24,-6,1,-29,38,10,-22,25,7,-25,-45,-24,1,0,-1,1,1,1,-1,-1,0,0,0,0,0,0,0,4,1,3,3,4,4,3,3,8.358662614,9.2307692308,9.9578705477,5.2611800075,9.8298676749,11.299435028,11.869436202,11.904761905,7.6016723679,9.3385214008,9.1185410334,10.769230769,6.8939103792,8.2675685832,11.342155009,4.5197740113,10.385756677,5.2083333333,4.5610034208,6.2256809339,-0.759878419,-1.538461538,3.0639601685,-3.006388576,-1.512287335,6.7796610169,1.4836795252,6.6964285714,3.0406689472,3.1128404669,0,0,0,0,0,0,0,0,0,0,0.7598784195,-22.30769231,29.107621601,7.5159714393,-16.63516068,18.832391714,5.1928783383,-18.60119048,-34.20752566,-18.6770428,0.7598784195,-22.30769231,29.107621601,7.5159714393,-16.63516068,18.832391714,5.1928783383,-18.60119048,-34.20752566,-18.6770428 +050,2,4,38,085,North Dakota,Sioux County,4153,4154,4148,4237,4331,4442,4467,4385,4455,4427,4382,4259,4173,-6,89,94,111,25,-82,70,-28,-45,-123,-86,23,95,104,104,98,106,84,94,83,74,71,15,38,35,58,45,45,56,30,48,43,73,8,57,69,46,53,61,28,64,35,31,-2,0,1,1,0,0,2,0,0,0,0,0,-14,31,25,64,-28,-146,43,-92,-81,-152,-84,-14,32,26,64,-28,-144,43,-92,-81,-152,-84,0,0,-1,1,0,1,-1,0,1,-2,0,44,44,44,44,52,52,52,60,44,60,54,52,22.659511032,24.276377218,23.709107489,22.000224492,23.949389968,19.004524887,21.166403963,18.844363719,17.127647263,16.840607211,9.0638044126,8.1699346405,13.222386869,10.102143899,10.167193854,12.669683258,6.7552353074,10.897945283,9.952551788,17.314990512,13.595706619,16.106442577,10.48672062,11.898080593,13.782196114,6.334841629,14.411168656,7.9464184357,7.1750954751,-0.474383302,0.2385211688,0.233426704,0,0,0.4518752824,0,0,0,0,0,7.3941562314,5.8356676004,14.590219993,-6.285778426,-32.98689562,9.7285067873,-20.71605494,-18.39028267,-35.1811133,-19.92409867,7.6326774001,6.0690943044,14.590219993,-6.285778426,-32.53502033,9.7285067873,-20.71605494,-18.39028267,-35.1811133,-19.92409867 +050,2,4,38,087,North Dakota,Slope County,727,727,732,728,769,773,781,783,784,769,766,754,747,5,-4,41,4,8,2,1,-15,-3,-12,-7,5,10,8,6,11,8,9,7,13,4,8,0,3,5,2,4,4,6,5,3,1,6,5,7,3,4,7,4,3,2,10,3,2,0,0,0,0,0,0,0,1,0,0,0,0,-11,36,1,1,-2,-2,-18,-13,-14,-10,0,-11,36,1,1,-2,-2,-17,-13,-14,-10,0,0,2,-1,0,0,0,0,0,-1,1,0,0,0,0,0,0,0,0,0,0,0,0,13.698630137,10.688042752,7.7821011673,14.157014157,10.230179028,11.486917677,9.0148100451,16.938110749,5.2631578947,10.659560293,4.1095890411,6.6800267201,2.5940337224,5.148005148,5.1150895141,7.6579451181,6.4391500322,3.9087947883,1.3157894737,7.9946702199,9.5890410959,4.0080160321,5.1880674449,9.009009009,5.1150895141,3.828972559,2.5756600129,13.029315961,3.9473684211,2.6648900733,0,0,0,0,0,0,1.2878300064,0,0,0,-15.06849315,48.096192385,1.2970168612,1.287001287,-2.557544757,-2.552648373,-23.18094012,-16.93811075,-18.42105263,-13.32445037,-15.06849315,48.096192385,1.2970168612,1.287001287,-2.557544757,-2.552648373,-21.89311011,-16.93811075,-18.42105263,-13.32445037 +050,2,4,38,089,North Dakota,Stark County,24199,24198,24359,25191,26917,28342,30345,31908,30937,30361,30934,31483,32107,161,832,1726,1425,2003,1563,-971,-576,573,549,624,73,296,410,438,515,553,564,491,513,544,544,35,240,211,236,242,242,244,214,240,239,251,38,56,199,202,273,311,320,277,273,305,293,20,54,34,40,38,92,58,142,61,33,28,98,716,1429,1143,1637,1140,-1357,-1004,244,211,304,118,770,1463,1183,1675,1232,-1299,-862,305,244,332,5,6,64,40,55,20,8,9,-5,0,-1,909,909,984,961,1009,728,632,599,578,544,548,542,11.94752775,15.736547171,15.852621292,17.550735257,17.76621207,17.948921951,16.020098535,16.738722571,17.431148565,17.109608429,9.687184662,8.0985645198,8.5415950343,8.2471416157,7.774725716,7.7651364468,6.9822832719,7.8309813198,7.6581700498,7.8943230068,2.2603430878,7.6379826514,7.3110262582,9.3035936408,9.9914863541,10.183785504,9.0378152631,8.9077412513,9.7729785155,9.2152854222,2.1796165489,1.3049819605,1.4477279719,1.2950057082,2.9556808507,1.8458111226,4.6331038533,1.9903744188,1.0574042328,0.8806416103,28.900100908,54.847624165,41.368826797,55.787482747,36.624740976,-43.1856154,-32.75800189,7.9614976752,6.7609785796,9.5612517691,31.079717457,56.152606126,42.816554769,57.082488456,39.580421827,-41.33980428,-28.12489804,9.951872094,7.8183828124,10.441893379 +050,2,4,38,091,North Dakota,Steele County,1975,1975,1993,1972,1953,1919,1914,1918,1916,1909,1903,1900,1890,18,-21,-19,-34,-5,4,-2,-7,-6,-3,-10,7,18,20,22,16,25,30,28,21,18,20,0,19,19,23,18,20,18,25,12,12,10,7,-1,1,-1,-2,5,12,3,9,6,10,0,0,0,0,0,0,0,0,0,0,0,10,-20,-20,-35,-3,-1,-12,-10,-15,-9,-20,10,-20,-20,-35,-3,-1,-12,-10,-15,-9,-20,1,0,0,2,0,0,-2,0,0,0,0,0,0,0,0,0,0,1,1,1,0,0,0,9.079445145,10.191082803,11.363636364,8.348552048,13.048016701,15.649452269,14.640522876,11.017838405,9.4662108861,10.55408971,9.5838587642,9.6815286624,11.880165289,9.392121054,10.438413361,9.3896713615,13.071895425,6.29590766,6.3108072574,5.2770448549,-0.504413619,0.5095541401,-0.516528926,-1.043569006,2.6096033403,6.2597809077,1.568627451,4.721930745,3.1554036287,5.2770448549,0,0,0,0,0,0,0,0,0,0,-10.08827238,-10.1910828,-18.0785124,-1.565353509,-0.521920668,-6.259780908,-5.22875817,-7.869884575,-4.733105443,-10.55408971,-10.08827238,-10.1910828,-18.0785124,-1.565353509,-0.521920668,-6.259780908,-5.22875817,-7.869884575,-4.733105443,-10.55408971 +050,2,4,38,093,North Dakota,Stutsman County,21100,21100,21138,21027,20992,21105,21154,21090,21124,21179,20897,20695,20498,38,-111,-35,113,49,-64,34,55,-282,-202,-197,66,218,237,229,253,224,235,215,240,226,224,39,246,255,237,236,237,236,253,263,214,248,27,-28,-18,-8,17,-13,-1,-38,-23,12,-24,6,4,8,11,24,38,22,41,19,9,5,8,-87,-22,111,13,-89,13,53,-280,-221,-178,14,-83,-14,122,37,-51,35,94,-261,-212,-173,-3,0,-3,-1,-5,0,0,-1,2,-2,0,1733,1733,1706,1696,1675,1683,1643,1662,1720,1638,1641,1646,10.340329657,11.280611152,10.879635128,11.973780733,10.605056339,11.133747098,10.164763728,11.40792851,10.867474514,10.87563421,11.668445393,12.137366429,11.259709718,11.169218391,11.220528359,11.181124745,11.96132662,12.501188326,10.290440469,12.040880732,-1.328115736,-0.856755277,-0.38007459,0.8045623417,-0.61547202,-0.047377647,-1.796562892,-1.093259816,0.577034045,-1.165246522,0.1897308194,0.3807801233,0.5226025608,1.1358527178,1.7990720576,1.042308239,1.938396804,0.9031276737,0.4327755338,0.2427596922,-4.126645322,-1.047145339,5.2735349312,0.6152535555,-4.213616135,0.6159094139,2.505732454,-13.30924993,-10.62704366,-8.642245042,-3.936914503,-0.666365216,5.796137492,1.7511062732,-2.414544077,1.6582176529,4.444129258,-12.40612225,-10.19426813,-8.399485349 +050,2,4,38,095,North Dakota,Towner County,2246,2246,2243,2260,2290,2263,2274,2250,2249,2247,2184,2166,2108,-3,17,30,-27,11,-24,-1,-2,-63,-18,-58,2,14,30,27,31,25,21,20,26,19,23,4,25,28,42,30,31,22,24,34,24,22,-2,-11,2,-15,1,-6,-1,-4,-8,-5,1,0,0,0,0,0,4,6,2,26,8,6,0,28,26,-11,9,-22,-6,-1,-82,-21,-64,0,28,26,-11,9,-18,0,1,-56,-13,-58,-1,0,2,-1,1,0,0,1,1,0,-1,43,43,44,44,44,35,34,33,34,34,32,32,6.2180768377,13.186813187,11.860311882,13.665417677,11.052166225,9.3354078684,8.896797153,11.735499887,8.7356321839,10.762751521,11.103708639,12.307692308,18.449374039,13.224597752,13.704686118,9.7799511002,10.676156584,15.346422929,11.034482759,10.294805803,-4.885631801,0.8791208791,-6.589062157,0.4408199251,-2.652519894,-0.444543232,-1.779359431,-3.610923042,-2.298850575,0.4679457183,0,0,0,0,1.7683465959,2.667259391,0.8896797153,11.735499887,3.6781609195,2.8076743098,12.436153675,11.428571429,-4.831978915,3.9673793255,-9.725906278,-2.667259391,-0.444839858,-37.01196118,-9.655172414,-29.94852597,12.436153675,11.428571429,-4.831978915,3.9673793255,-7.957559682,0,0.4448398577,-25.2764613,-5.977011494,-27.14085166 +050,2,4,38,097,North Dakota,Traill County,8121,8121,8104,8068,8072,8191,8045,7991,8010,7996,7994,8037,7959,-17,-36,4,119,-146,-54,19,-14,-2,43,-78,22,88,106,91,96,92,107,99,78,94,89,26,77,104,81,98,106,109,91,81,74,96,-4,11,2,10,-2,-14,-2,8,-3,20,-7,1,0,3,3,0,0,1,3,4,1,2,-14,-47,1,103,-149,-40,21,-24,-2,22,-72,-13,-47,4,106,-149,-40,22,-21,2,23,-70,0,0,-2,3,5,0,-1,-1,-1,0,-1,362,362,315,309,395,355,352,348,315,312,305,301,10.883007668,13.135068154,11.191047162,11.825572801,11.474183088,13.374164115,12.370361115,9.756097561,11.727278398,11.127781945,9.5226317091,12.887236679,9.9612617598,12.071938901,13.220254428,13.624148491,11.370735974,10.131332083,9.2321127815,12.00300075,1.3603759584,0.2478314746,1.2297854024,-0.2463661,-1.746071339,-0.249984376,0.9996251406,-0.375234522,2.4951656166,-0.875218805,0,0.3717472119,0.3689356207,0,0,0.124992188,0.3748594277,0.5003126954,0.1247582808,0.2500625156,-5.812515459,0.1239157373,12.666789645,-18.35427445,-4.988775256,2.6248359478,-2.998875422,-0.250156348,2.7446821783,-9.002250563,-5.812515459,0.4956629492,13.035725266,-18.35427445,-4.988775256,2.7498281357,-2.624015994,0.2501563477,2.8694404591,-8.752188047 +050,2,4,38,099,North Dakota,Walsh County,11119,11126,11114,11024,11021,11079,10907,10852,10813,10786,10602,10574,10437,-12,-90,-3,58,-172,-55,-39,-27,-184,-28,-137,26,125,121,153,133,159,150,140,136,123,125,16,133,124,163,158,156,154,136,150,132,132,10,-8,-3,-10,-25,3,-4,4,-14,-9,-7,1,4,11,20,14,23,18,21,12,1,3,-23,-85,-8,50,-164,-81,-52,-52,-181,-19,-134,-22,-81,3,70,-150,-58,-34,-31,-169,-18,-131,0,-1,-3,-2,3,0,-1,0,-1,-1,1,332,332,328,327,322,328,328,327,331,332,333,329,11.292799711,10.977545929,13.846153846,12.098608205,14.614642217,13.847219017,12.963563128,12.717411633,11.616924821,11.898529342,12.015538892,11.249716489,14.751131222,14.37278268,14.338894251,14.216478191,12.59317561,14.026556948,12.46694371,12.564846985,-0.722739181,-0.27217056,-0.904977376,-2.274174475,0.2757479664,-0.369259174,0.3703875179,-1.309145315,-0.850018889,-0.666317643,0.3613695907,0.9979587208,1.8099547511,1.2735377058,2.1140677421,1.661666282,1.9445344692,1.1221245558,0.0944465433,0.2855647042,-7.679103803,-0.725788161,4.5248868778,-14.91858455,-7.445195092,-4.800369259,-4.815037733,-16.92537872,-1.794484322,-12.75522345,-7.317734213,0.2721705602,6.334841629,-13.64504685,-5.33112735,-3.138702977,-2.870503264,-15.80325416,-1.700037779,-12.46965875 +050,2,4,38,101,North Dakota,Ward County,61675,61675,62128,64386,65595,68028,69587,71409,70164,69226,68504,68449,68466,453,2258,1209,2433,1559,1822,-1245,-938,-722,-55,17,260,1063,1118,1098,1273,1301,1219,1200,1112,1094,1070,102,495,472,512,519,479,440,464,494,475,530,158,568,646,586,754,822,779,736,618,619,540,82,60,396,265,213,397,297,397,114,91,90,195,1615,131,1519,569,592,-2331,-2080,-1457,-763,-614,277,1675,527,1784,782,989,-2034,-1683,-1343,-672,-524,18,15,36,63,23,11,10,9,3,-2,1,2685,2679,2898,3424,3333,3430,3355,3270,3148,3156,3187,3151,16.804464328,17.202514214,16.434296491,18.500890165,18.454424239,17.220797751,17.217877897,16.147535032,15.976283835,15.630135486,7.8252209242,7.2625999184,7.6633513692,7.5427824002,6.7945189934,6.2158744958,6.6575794533,7.1734553111,6.9366863084,7.7420297265,8.9792434039,9.9399142952,8.7709451217,10.958107764,11.659905246,11.004923255,10.560298443,8.9740797212,9.0395975262,7.888105759,0.9485116272,6.0931982367,3.9663830329,3.095592777,5.6313654288,4.1957152847,5.6962479374,1.6554127641,1.3289230612,1.3146842932,25.530771298,2.0156792147,22.735606894,8.2694473713,8.3974013447,-32.93000784,-29.84432169,-21.15733682,-11.14250874,-8.9690684,26.479282925,8.1088774513,26.701989927,11.365040148,14.028766774,-28.73429256,-24.14807375,-19.50192405,-9.813585683,-7.654384107 +050,2,4,38,103,North Dakota,Wells County,4207,4207,4192,4198,4235,4148,4123,4094,4052,3993,3895,3794,3709,-15,6,37,-87,-25,-29,-42,-59,-98,-101,-85,10,33,44,41,36,39,51,47,50,37,37,28,88,68,81,55,53,62,73,64,59,58,-18,-55,-24,-40,-19,-14,-11,-26,-14,-22,-21,1,1,4,3,4,2,1,2,0,0,0,2,60,54,-49,-10,-16,-33,-35,-84,-78,-63,3,61,58,-46,-6,-14,-32,-33,-84,-78,-63,0,0,3,-1,0,-1,1,0,0,-1,-1,119,119,115,114,110,87,98,100,92,86,86,71,7.8665077473,10.435195067,9.7817010617,8.7051142546,9.4925155166,12.521482936,11.684275948,12.677484787,9.6241383795,9.862721578,20.977353993,16.127119649,19.324824049,13.299480111,12.900085189,15.222194942,18.147917961,16.227180527,15.346599038,15.460482474,-13.11084625,-5.691924582,-9.543122987,-4.594365857,-3.407569673,-2.700712006,-6.463642014,-3.54969574,-5.722460658,-5.597760896,0.2383790226,0.948654097,0.715734224,0.9672349172,0.4867956675,0.2455192733,0.4972032318,0,0,0,14.302741359,12.806830309,-11.69032566,-2.418087293,-3.89436534,-8.102136018,-8.701056557,-21.29817444,-20.28872415,-16.79328269,14.541120381,13.755484406,-10.97459144,-1.450852376,-3.407569673,-7.856616744,-8.203853325,-21.29817444,-20.28872415,-16.79328269 +050,2,4,38,105,North Dakota,Williams County,22398,22399,22591,24417,26755,29623,32166,35379,34286,33639,35698,37897,38700,192,1826,2338,2868,2543,3213,-1093,-647,2059,2199,803,97,348,445,524,596,716,690,675,706,800,845,41,226,233,240,238,223,243,206,235,233,252,56,122,212,284,358,493,447,469,471,567,593,3,-7,-12,-3,9,44,58,174,87,37,27,122,1695,2037,2491,2089,2627,-1610,-1302,1496,1599,180,125,1688,2025,2488,2098,2671,-1552,-1128,1583,1636,207,11,16,101,96,87,49,12,12,5,-4,3,560,560,554,628,553,552,517,516,493,499,457,423,14.80599047,17.392323927,18.588811238,19.291459645,21.200681027,19.809086342,19.87486198,20.364307657,21.740607378,22.063527292,9.6153846154,9.1065426405,8.5139593458,7.7036365696,6.6030054038,6.9762434508,6.0655134339,6.7784876761,6.3319518989,6.5798921629,5.1906058543,8.2857812866,10.074851893,11.587823075,14.597675624,12.832842891,13.809348546,13.585819981,15.408655479,15.483635129,-0.297821647,-0.469006488,-0.106424492,0.2913139879,1.3028351469,1.6651116055,5.1232977549,2.5094826716,1.0055030912,0.704988446,72.115384615,79.613851325,88.367803044,67.61721342,77.78518025,-46.22120146,-38.33640044,43.1515641,43.454038997,4.6999229735,71.817562968,79.144844837,88.261378552,67.908527408,79.088015397,-44.55608986,-33.21310269,45.661046772,44.459542088,5.4049114195 +040,2,3,39,000,Ohio,Ohio,11536504,11536763,11539449,11545735,11550971,11579692,11606573,11622315,11640060,11665706,11680892,11696507,11693217,2686,6286,5236,28721,26881,15742,17745,25646,15186,15615,-3290,34787,137935,137686,139117,139567,139571,138845,136676,136942,134059,133153,26546,110629,111350,114505,111892,118311,117583,122155,124094,120544,126835,8241,27306,26336,24612,27675,21260,21262,14521,12848,13515,6318,3507,15512,18352,24896,21553,25327,25041,20084,14101,15768,13303,-8704,-36486,-39051,-20077,-21319,-30228,-28200,-8612,-11486,-13711,-23146,-5197,-20974,-20699,4819,234,-4901,-3159,11472,2615,2057,-9843,-358,-46,-401,-710,-1028,-617,-358,-347,-277,43,235,306496,308969,309680,310256,310387,311681,312362,313590,317560,314865,315497,309717,11.950088854,11.922565928,12.028794851,12.038765191,12.017019497,11.937302189,11.728942958,11.731216685,11.469111683,11.385598223,9.5844157014,9.6420675745,9.9007105849,9.6515760516,10.186540139,10.109285918,10.482813566,10.630585236,10.312866714,10.84536098,2.3656731521,2.2804983533,2.1280842663,2.3871891398,1.8304793583,1.8280162709,1.2461293913,1.1006314496,1.1562449698,0.5402372426,1.3438922557,1.5891443568,2.152640415,1.8591178872,2.1806467877,2.1529186078,1.7235219816,1.2079704289,1.3489952411,1.1375080783,-3.16098845,-3.381521157,-1.735964075,-1.838933524,-2.602621357,-2.424515983,-0.739044578,-0.983954921,-1.173013302,-1.979159737,-1.817096195,-1.7923768,0.41667634,0.0201843635,-0.421974569,-0.271597376,0.9844774036,0.2240155075,0.1759819388,-0.841651659 +050,2,3,39,001,Ohio,Adams County,28550,28532,28530,28454,28288,28085,28060,27919,27817,27747,27685,27640,27531,-2,-76,-166,-203,-25,-141,-102,-70,-62,-45,-109,93,351,330,365,314,303,348,329,372,333,346,102,304,326,338,329,332,360,354,349,351,389,-9,47,4,27,-15,-29,-12,-25,23,-18,-43,-1,-2,4,5,14,8,9,9,8,8,8,12,-121,-175,-236,-20,-118,-99,-53,-93,-34,-75,11,-123,-171,-231,-6,-110,-90,-44,-85,-26,-67,-4,0,1,1,-4,-2,0,-1,0,-1,1,338,338,338,338,338,338,338,338,338,338,338,338,12.319247508,11.631595643,12.949461622,11.185323715,10.825488129,12.487440792,11.842199986,13.421850195,12.037957524,12.54282141,10.669661659,11.490606605,11.991556241,11.719654466,11.861590954,12.918042199,12.742063206,12.592004618,12.68865793,14.101611354,1.6495858487,0.1409890381,0.9579053802,-0.534330751,-1.036102824,-0.430601407,-0.899863221,0.8298455766,-0.650700407,-1.558789944,-0.070195142,0.1409890381,0.1773898852,0.4987087007,0.2858214688,0.322951055,0.3239507595,0.2886419397,0.2892001808,0.2900074314,-4.246806121,-6.168270417,-8.372802583,-0.712441001,-4.215866664,-3.552461605,-1.907710028,-3.355462549,-1.229100768,-2.71881967,-4.317001264,-6.027281379,-8.195412698,-0.2137323,-3.930045196,-3.22951055,-1.583759269,-3.066820609,-0.939900587,-2.428812238 +050,2,3,39,003,Ohio,Allen County,106331,106295,106342,105981,105251,105071,104886,104141,103691,103173,102747,102450,101980,47,-361,-730,-180,-185,-745,-450,-518,-426,-297,-470,337,1317,1222,1289,1323,1250,1279,1214,1251,1247,1237,220,1077,1065,1139,1063,1109,1134,1150,1154,1141,1168,117,240,157,150,260,141,145,64,97,106,69,17,61,46,32,14,32,41,40,24,31,28,-75,-664,-948,-360,-451,-923,-636,-622,-548,-436,-568,-58,-603,-902,-328,-437,-891,-595,-582,-524,-405,-540,-12,2,15,-2,-8,5,0,0,1,2,1,5934,6076,6011,6065,6005,6065,5919,5970,5991,5863,5800,5743,12.405627275,11.570216634,12.257395803,12.602580528,11.960177393,12.308018015,11.737179983,12.15034965,12.154173794,12.101941985,10.14492071,10.083699439,10.831011497,10.125882919,10.611069383,10.912660226,11.118415964,11.208236208,11.121020288,11.426894291,2.260706565,1.4865171944,1.426384306,2.4766976095,1.34910801,1.395357789,0.6187640189,0.9421134421,1.0331535061,0.6750476936,0.5745962519,0.4355400697,0.3042953186,0.1333606405,0.3061805413,0.3945494438,0.3867275118,0.2331002331,0.3021486669,0.2739323974,-6.254621496,-8.97591274,-3.423322334,-4.296117776,-8.831394987,-6.120327957,-6.013612808,-5.322455322,-4.249574799,-5.556914347,-5.680025245,-8.540372671,-3.119027016,-4.162757136,-8.525214446,-5.725778513,-5.626885297,-5.089355089,-3.947426132,-5.28298195 +050,2,3,39,005,Ohio,Ashland County,53139,53136,53317,53255,53245,53163,53169,53317,53487,53673,53727,53418,53362,181,-62,-10,-82,6,148,170,186,54,-309,-56,166,597,606,630,650,622,573,604,604,600,596,90,569,538,575,528,545,593,587,581,585,620,76,28,68,55,122,77,-20,17,23,15,-24,9,51,91,96,100,123,106,87,57,79,69,91,-139,-164,-239,-217,-44,86,86,-23,-404,-103,100,-88,-73,-143,-117,79,192,173,34,-325,-34,5,-2,-5,6,1,-8,-2,-4,-3,1,2,2144,2283,2356,2399,2253,2130,2230,2332,2393,2349,2184,2024,11.203693278,11.38028169,11.841214946,12.225858631,11.682286873,10.729935208,11.272863009,11.247672253,11.199776004,11.163139165,10.678226926,10.103286385,10.807458086,9.9311590114,10.236087373,11.104453017,10.95558044,10.819366853,10.919781604,11.612661547,0.5254663514,1.2769953052,1.0337568604,2.2946996201,1.4461995004,-0.374517808,0.3172825681,0.4283054004,0.2799944001,-0.449522382,0.9570994257,1.7089201878,1.8043756109,1.8809013279,2.3101628383,1.9849443841,1.6237402016,1.061452514,1.4746371739,1.2923768496,-2.608565102,-3.079812207,-4.492143448,-4.081555882,-0.826399715,1.6104265758,1.6050765211,-0.4283054,-7.54118251,-1.929200225,-1.651465676,-1.370892019,-2.687767837,-2.200654554,1.4837631238,3.5953709599,3.2288167227,0.6331471136,-6.066545336,-0.636823375 +050,2,3,39,007,Ohio,Ashtabula County,101497,101497,101411,101100,100274,99779,99064,98443,98172,97773,97536,97088,96513,-86,-311,-826,-495,-715,-621,-271,-399,-237,-448,-575,283,1156,1089,1122,1077,1112,1085,1156,1138,1103,1073,275,1150,1167,1191,1141,1214,1163,1213,1227,1229,1234,8,6,-78,-69,-64,-102,-78,-57,-89,-126,-161,10,52,56,71,63,84,84,77,100,9,30,-102,-365,-813,-498,-720,-603,-271,-417,-246,-331,-444,-92,-313,-757,-427,-657,-519,-187,-340,-146,-322,-414,-2,-4,9,1,6,0,-6,-2,-2,0,0,3190,3189,3190,3340,3428,3451,3430,3455,3465,3436,3445,3212,11.416663786,10.815696167,11.217027488,10.832666978,11.260360392,11.036797803,11.799229376,11.653328828,11.334676093,11.084653488,11.357407746,11.59037413,11.906844686,11.476390921,12.293235176,11.830226585,12.381025288,12.56470516,12.629480434,12.747868038,0.0592560404,-0.774677962,-0.689817198,-0.643723943,-1.032874784,-0.793428782,-0.581795912,-0.911376332,-1.294804341,-1.66321455,0.5135523502,0.5561790499,0.7098118998,0.6336657564,0.8506027634,0.8544617654,0.7859348287,1.0240183504,0.0924860243,0.3099157546,-3.604742458,-8.074527993,-4.97868065,-7.241894359,-6.106112695,-2.75665641,-4.25629641,-2.519085142,-3.401430451,-4.586753168,-3.091190108,-7.518348943,-4.26886875,-6.608228602,-5.255509931,-1.902194644,-3.470361581,-1.495066792,-3.308944426,-4.276837413 +050,2,3,39,009,Ohio,Athens County,64757,64763,65175,65092,64633,64628,64833,65949,66402,66587,65673,65582,65481,412,-83,-459,-5,205,1116,453,185,-914,-91,-101,140,558,567,540,562,544,508,515,503,472,473,155,520,455,445,459,500,512,460,489,506,536,-15,38,112,95,103,44,-4,55,14,-34,-63,44,246,279,394,314,295,294,228,165,194,157,339,-370,-875,-506,-207,763,162,-96,-1104,-255,-198,383,-124,-596,-112,107,1058,456,132,-939,-61,-41,44,3,25,12,-5,14,1,-2,11,4,3,9345,9774,9643,9460,9035,9110,9966,10332,10120,9540,9558,9598,8.5670200434,8.741568703,8.3551883399,8.6821513815,8.3191876558,7.6765570339,7.7450014663,7.6062301527,7.1921069674,7.2179028406,7.9836029079,7.0148390827,6.8852940949,7.0909385838,7.6463121836,7.7370023649,6.9178653874,7.3945259338,7.7101824692,8.1792725636,0.5834171356,1.7267296204,1.469894245,1.5912127977,0.6728754722,-0.060445331,0.8271360789,0.211704219,-0.518075502,-0.961369723,3.7768582987,4.3014068221,6.0961929739,4.8508817327,4.5113241883,4.4427318267,3.4288550181,2.4950854378,2.9560778637,2.395794389,-5.680640531,-13.49007516,-7.829120926,-3.197874263,11.668272392,2.4480359045,-1.443728429,-16.69438984,-3.885566264,-3.021447701,-1.903782232,-9.188668337,-1.732927952,1.6530074694,16.179596581,6.8907677313,1.9851265894,-14.1993044,-0.9294884,-0.625653312 +050,2,3,39,011,Ohio,Auglaize County,45949,45933,45914,45758,45787,45820,45756,45754,45772,45756,45728,45610,45680,-19,-156,29,33,-64,-2,18,-16,-28,-118,70,130,573,510,534,526,565,566,582,573,541,530,100,460,451,519,489,466,517,477,494,500,534,30,113,59,15,37,99,49,105,79,41,-4,3,27,34,42,34,39,21,14,8,13,9,-54,-297,-60,-22,-133,-138,-50,-134,-115,-172,64,-51,-270,-26,20,-99,-99,-29,-120,-107,-159,73,2,1,-4,-2,-2,-2,-2,-1,0,0,1,525,525,525,525,525,525,525,525,526,526,526,526,12.501090846,11.142061281,11.658497713,11.487726042,12.348377227,12.368070275,12.717419806,12.526780639,11.846110053,11.61134845,10.035779736,9.8530777213,11.331011822,10.679654058,10.18467927,11.297336276,10.423039944,10.79970268,10.948345705,11.698981268,2.4653111092,1.28898356,0.3274858908,0.8080719839,2.1636979565,1.0707339991,2.2943798619,1.727077959,0.8977643478,-0.087632818,0.5890566367,0.7428040854,0.9169604943,0.7425526339,0.8523658617,0.4588859996,0.3059173149,0.1748939705,0.2846569883,0.1971738416,-6.479623004,-1.310830739,-0.48031264,-2.904691185,-3.016063818,-1.092585713,-2.928065729,-2.514100826,-3.766230923,1.4021250958,-5.890566367,-0.568026654,0.4366478544,-2.162138552,-2.163697957,-0.633699714,-2.622148414,-2.339206856,-3.481573934,1.5992989375 +050,2,3,39,013,Ohio,Belmont County,70400,70402,70337,70132,69728,69593,69403,69018,68642,68074,67492,66979,65932,-65,-205,-404,-135,-190,-385,-376,-568,-582,-513,-1047,202,721,709,733,692,706,624,650,598,652,639,226,924,933,940,836,865,857,900,975,846,907,-24,-203,-224,-207,-144,-159,-233,-250,-377,-194,-268,1,1,-2,-9,-9,6,16,10,3,7,7,-35,2,-165,93,-23,-225,-154,-329,-206,-325,-784,-34,3,-167,84,-32,-219,-138,-319,-203,-318,-777,-7,-5,-13,-12,-14,-7,-5,1,-2,-1,-2,3834,3799,3800,3833,3848,3846,3842,3814,3799,3830,3803,3552,10.265610206,10.138710139,10.522462515,9.9571210682,10.200764335,9.0658143251,9.5087626905,8.8222710709,9.6972581449,9.6154569599,13.155927642,13.341913342,13.494017413,12.02912314,12.498103611,12.450966148,13.16597911,14.384137616,12.582638636,13.648230771,-2.890317437,-3.203203203,-2.971554898,-2.072002072,-2.297339277,-3.385151823,-3.657216419,-5.561866545,-2.885380491,-4.032773811,0.0142380169,-0.028600029,-0.129198039,-0.12950013,0.0866920482,0.2324567776,0.1462886568,0.044258885,0.1041116672,0.1053336443,0.0284760339,-2.35950236,1.3350464036,-0.330944775,-3.250951806,-2.237396484,-4.812896808,-3.039110101,-4.833755977,-11.79736816,0.0427140508,-2.388102388,1.2058483646,-0.460444905,-3.164259758,-2.004939707,-4.666608151,-2.994851216,-4.72964431,-11.69203452 +050,2,3,39,015,Ohio,Brown County,44846,44831,44868,44632,44289,44125,43950,43717,43660,43558,43623,43473,43414,37,-236,-343,-164,-175,-233,-57,-102,65,-150,-59,135,509,522,504,488,485,485,512,465,510,486,102,485,451,492,474,496,521,550,546,544,541,33,24,71,12,14,-11,-36,-38,-81,-34,-55,0,-4,-4,-5,1,1,6,-2,-4,-3,-3,8,-256,-416,-170,-189,-222,-25,-60,153,-114,-3,8,-260,-420,-175,-188,-221,-19,-62,149,-117,-6,-4,0,6,-1,-1,-1,-2,-2,-3,1,2,575,575,575,575,575,575,575,575,575,575,575,575,11.374301676,11.740758651,11.400909358,11.081464661,11.064596713,11.101319569,11.740695728,10.667461947,11.711215211,11.186943962,10.837988827,10.143835539,11.129459135,10.763553789,11.315546329,11.925335042,12.612075489,12.525664996,12.491962892,12.452956138,0.5363128492,1.5969231115,0.2714502228,0.3179108714,-0.250949616,-0.824015473,-0.871379761,-1.858203049,-0.780747681,-1.266012177,-0.089385475,-0.089967499,-0.11310426,0.0227079194,0.0228136015,0.1373359122,-0.045862093,-0.091763114,-0.068889501,-0.06905521,-5.720670391,-9.356619921,-3.845544823,-4.291796764,-5.064619526,-0.572232967,-1.375862781,3.5099390922,-2.617801047,-0.06905521,-5.810055866,-9.44658742,-3.958649083,-4.269088845,-5.041805925,-0.434897055,-1.421724873,3.4181759787,-2.686690548,-0.138110419 +050,2,3,39,017,Ohio,Butler County,368130,368138,369111,370164,370628,371497,373877,376173,378527,380751,382114,383603,385648,973,1053,464,869,2380,2296,2354,2224,1363,1489,2045,1157,4543,4470,4699,4417,4536,4579,4387,4532,4490,4426,631,3051,3014,3038,3099,3290,3281,3474,3538,3445,3747,526,1492,1456,1661,1318,1246,1298,913,994,1045,679,158,686,660,966,761,928,793,665,416,541,447,310,-1122,-1634,-1757,381,171,282,669,-39,-105,902,468,-436,-974,-791,1142,1099,1075,1334,377,436,1349,-21,-3,-18,-1,-80,-49,-19,-23,-8,8,17,10953,11207,11184,11134,11014,11208,11446,11700,11949,11765,11827,12209,12.290419668,12.068164883,12.663634832,11.851768374,12.095193654,12.134623029,11.555714771,11.881525565,11.727570369,11.507297358,8.2540326671,8.1372369032,8.1872999832,8.3152887007,8.7727484834,8.694845634,9.1507985218,9.2755598959,8.9981024321,9.7419437869,4.0363870008,3.9309279798,4.4763348493,3.5364796733,3.3224451703,3.439777395,2.4049162494,2.6059656689,2.7294679366,1.7653535712,1.8558723073,1.7818766941,2.6033350177,2.0419279449,2.4745016999,2.1014972837,1.7516640809,1.0906254711,1.4130546925,1.1621694349,-3.03540631,-4.411494725,-4.735051373,1.0223055808,0.455969602,0.7473168146,1.7622004062,-0.102246138,-0.274252759,2.3451383229,-1.179534003,-2.62961803,-2.131716355,3.0642335257,2.9304713019,2.8488140983,3.5138644871,0.9883793332,1.1388019334,3.5073077578 +050,2,3,39,019,Ohio,Carroll County,28836,28847,28859,28832,28551,28272,28144,27729,27630,27329,27134,26984,26897,12,-27,-281,-279,-128,-415,-99,-301,-195,-150,-87,79,309,243,280,265,280,281,275,281,274,269,42,292,308,288,339,354,291,340,342,330,340,37,17,-65,-8,-74,-74,-10,-65,-61,-56,-71,0,0,1,7,4,1,-1,-1,-1,-1,-1,-22,-42,-220,-279,-56,-344,-87,-238,-133,-92,-16,-22,-42,-219,-272,-52,-343,-88,-239,-134,-93,-17,-3,-2,3,1,-2,2,-1,3,0,-1,1,405,405,405,405,405,405,405,405,405,405,405,405,10.712242811,8.4694073158,9.8551642821,9.3944980147,10.02273012,10.151917484,10.007460107,10.318932119,10.126020917,9.9849668714,10.122896119,10.734886639,10.136740404,12.017867272,12.671594509,10.513195686,12.372859768,12.558984999,12.195572638,12.620404224,0.5893466919,-2.265479323,-0.281576122,-2.623369257,-2.648864389,-0.361278202,-2.365399662,-2.24005288,-2.06955172,-2.635437353,0,0.034853528,0.2463791071,0.1418037436,0.0357954647,-0.03612782,-0.036390764,-0.036722178,-0.036956281,-0.037118836,-1.456033003,-7.667776171,-9.819967267,-1.985252411,-12.31363986,-3.14312036,-8.661001838,-4.884049722,-3.399977826,-0.593901375,-1.456033003,-7.632922643,-9.57358816,-1.843448667,-12.2778444,-3.17924818,-8.697392602,-4.9207719,-3.436934107,-0.631020211 +050,2,3,39,021,Ohio,Champaign County,40097,40101,40078,39828,39579,39468,39089,38976,38760,38857,38799,38930,38960,-23,-250,-249,-111,-379,-113,-216,97,-58,131,30,95,421,391,415,386,394,412,402,437,389,388,66,404,375,375,369,430,421,408,447,386,429,29,17,16,40,17,-36,-9,-6,-10,3,-41,3,24,26,13,7,9,6,5,4,5,4,-52,-293,-293,-166,-411,-81,-214,100,-50,125,65,-49,-269,-267,-153,-404,-72,-208,105,-46,130,69,-3,2,2,2,8,-5,1,-2,-2,-2,2,793,833,830,838,797,793,781,701,679,672,672,672,10.537381423,9.8479982873,10.50008223,9.8272591876,10.094152309,10.599979418,10.358555471,11.254764603,10.0091343,9.9627680062,10.111881461,9.4450111451,9.488026111,9.3944524358,11.016460642,10.831532366,10.513160777,11.512310704,9.9319430328,11.015534728,0.4254999625,0.4029871422,1.0120561185,0.4328067518,-0.922308333,-0.231552948,-0.154605306,-0.257546101,0.0771912671,-1.052766722,0.6007058293,0.6548541061,0.3289182385,0.1782145449,0.2305770832,0.1543686323,0.1288377546,0.1030184403,0.1286521118,0.1027089485,-7.333617,-7.379702041,-4.200032892,-10.4637397,-2.075193749,-5.505814552,2.5767550923,-1.287730504,3.2163027956,1.6690204134,-6.732911171,-6.724847935,-3.871114653,-10.28552516,-1.844616666,-5.35144592,2.7055928469,-1.184712063,3.3449549074,1.7717293619 +050,2,3,39,023,Ohio,Clark County,138333,138339,138272,137823,137198,136682,136364,135810,134805,134636,134697,134315,133593,-67,-449,-625,-516,-318,-554,-1005,-169,61,-382,-722,434,1623,1592,1597,1555,1628,1587,1546,1641,1540,1530,377,1601,1709,1745,1616,1802,1820,1827,1735,1727,1785,57,22,-117,-148,-61,-174,-233,-281,-94,-187,-255,26,90,56,44,34,85,90,76,34,67,62,-140,-560,-555,-399,-273,-456,-861,45,124,-262,-530,-114,-470,-499,-355,-239,-371,-771,121,158,-195,-468,-10,-1,-9,-13,-18,-9,-1,-9,-3,0,1,2798,2815,2776,2831,2807,2828,2862,2787,3481,3715,3520,3293,11.756822833,11.577297734,11.66204177,11.390022194,11.962935475,11.728839865,11.475610616,12.185658646,11.449303377,11.421831375,11.597457397,12.428141851,12.742807069,11.836833354,13.241529316,13.450843449,13.561410476,12.883679311,12.83957593,13.325469937,0.1593654358,-0.850844117,-1.080765299,-0.44681116,-1.278593841,-1.722003584,-2.08579986,-0.698020666,-1.390272553,-1.903638562,0.6519495101,0.4072416288,0.3213086023,0.2490422859,0.6246004394,0.6651515991,0.5641309229,0.25247556,0.498119043,0.4628454544,-4.05657473,-4.036055428,-2.913684825,-1.99966306,-3.350797652,-6.363283632,0.3340248886,0.9207932188,-1.947868497,-3.95658211,-3.40462522,-3.6288138,-2.592376223,-1.750620775,-2.726197212,-5.698132033,0.8981558115,1.1732687788,-1.449749454,-3.493736656 +050,2,3,39,025,Ohio,Clermont County,197363,197370,197613,198886,199526,200504,201516,202077,203332,204456,205803,206851,207449,243,1273,640,978,1012,561,1255,1124,1347,1048,598,619,2443,2378,2327,2258,2350,2356,2266,2361,2252,2258,416,1551,1530,1646,1603,1733,1793,1814,1880,1886,1968,203,892,848,681,655,617,563,452,481,366,290,34,85,113,131,83,164,201,169,73,141,115,26,303,-296,203,312,-195,501,518,799,538,179,60,388,-183,334,395,-31,702,687,872,679,294,-20,-7,-25,-37,-38,-25,-10,-15,-6,3,14,1717,1717,1717,1717,1717,1717,1717,1717,1718,1716,1715,1716,12.322855795,11.937391444,11.63412744,11.233271977,11.645395237,11.622830278,11.11361786,11.509802344,10.914713053,10.900313782,7.8234749646,7.6804915515,8.2293827963,7.9747276255,8.5878595516,8.8453882376,8.8967796993,9.1649421463,9.1408298478,9.5003620565,4.4993808307,4.2568998926,3.4047446442,3.258544351,3.0575356857,2.77744204,2.216838161,2.3448601981,1.7738832048,1.3999517258,0.4287526576,0.5672519904,0.6549508787,0.4129147804,0.8126999229,0.9915912079,0.8288620558,0.3558727536,0.6833812346,0.5551532706,1.5283771207,-1.485899019,1.0149238807,1.552161584,-0.96632003,2.4715780853,2.5405357686,3.8951004122,2.6075113776,0.8641081342,1.9571297784,-0.918647029,1.6698747594,1.9650763644,-0.153620107,3.4631692932,3.3693978244,4.2509731657,3.2908926122,1.4192614048 +050,2,3,39,027,Ohio,Clinton County,42040,42046,41922,41919,41829,41879,41824,41864,41923,42035,42119,42002,41921,-124,-3,-90,50,-55,40,59,112,84,-117,-81,132,486,514,521,508,526,510,500,482,433,455,113,414,458,435,428,442,419,460,485,441,502,19,72,56,86,80,84,91,40,-3,-8,-47,4,15,15,18,11,17,22,29,13,26,25,-157,-92,-156,-53,-141,-55,-53,47,76,-135,-61,-153,-77,-141,-35,-130,-38,-31,76,89,-109,-36,10,2,-5,-1,-5,-6,-1,-4,-2,0,2,1145,1145,1136,1124,1109,1073,1158,1111,1108,1121,1122,1123,11.593373171,12.274919998,12.448033641,12.138155144,12.570499952,12.173726234,11.910717263,11.455189296,10.294694547,10.843273,9.8758364046,10.937574629,10.39327185,10.226634649,10.563043686,10.001551553,10.957859882,11.526487155,10.484896756,11.963347354,1.717536766,1.3373453694,2.054761791,1.9115204951,2.0074562661,2.172174681,0.9528573811,-0.071297859,-0.190202209,-1.120074354,0.3578201596,0.3582175097,0.4300664214,0.2628340681,0.406270911,0.5251411317,0.6908216013,0.3089573876,0.6181571784,0.5957842308,-2.194630312,-3.725462101,-1.266306685,-3.369054873,-1.314405889,-1.265112726,1.1196074228,1.8062124201,-3.209662272,-1.453713523,-1.836810153,-3.367244591,-0.836240264,-3.106220805,-0.908134978,-0.739971595,1.810429024,2.1151698077,-2.591505094,-0.857929292 +050,2,3,39,029,Ohio,Columbiana County,107841,107850,107889,107437,106652,106007,105681,104788,103926,103198,102534,101794,101118,39,-452,-785,-645,-326,-893,-862,-728,-664,-740,-676,286,1110,1106,1079,1106,1066,1101,1050,1033,975,976,242,1175,1155,1219,1233,1338,1269,1287,1300,1287,1326,44,-65,-49,-140,-127,-272,-168,-237,-267,-312,-350,13,18,22,16,23,21,49,42,32,39,34,-6,-402,-765,-519,-208,-642,-741,-532,-428,-468,-363,7,-384,-743,-503,-185,-621,-692,-490,-396,-429,-329,-12,-3,7,-2,-14,0,-2,-1,-1,1,3,3944,3956,3946,3944,3934,3942,3954,3948,3954,3968,3951,3943,10.309948636,10.332151582,10.147701249,10.449340539,10.129757827,10.550322451,10.13885402,10.042190811,9.543479112,9.6199337644,10.913684367,10.789905133,11.464363135,11.649219606,12.714461512,12.160180917,12.427338213,12.637800634,12.597392428,13.069705094,-0.603735731,-0.457753551,-1.316661886,-1.199879067,-2.584703686,-1.609858467,-2.288484193,-2.595609822,-3.053913316,-3.449771329,0.1671883563,0.2055220025,0.1504756441,0.2173009334,0.1995543287,0.4695420528,0.4055541608,0.3110843233,0.3817391645,0.3351206434,-3.73387329,-7.146560543,-4.881053706,-1.965156268,-6.100660905,-7.100625737,-5.13701937,-4.160752824,-4.580869974,-3.577905693,-3.566684934,-6.94103854,-4.730578062,-1.747855334,-5.901106576,-6.631083684,-4.731465209,-3.849668501,-4.199130809,-3.24278505 +050,2,3,39,031,Ohio,Coshocton County,36901,36900,36938,36930,36821,36721,36530,36579,36651,36535,36607,36549,36449,38,-8,-109,-100,-191,49,72,-116,72,-58,-100,116,426,440,476,427,464,500,464,458,437,448,69,387,400,437,447,362,383,390,450,439,442,47,39,40,39,-20,102,117,74,8,-2,6,1,3,7,14,12,3,8,6,6,3,3,-7,-49,-153,-153,-184,-52,-51,-195,60,-58,-109,-6,-46,-146,-139,-172,-49,-43,-189,66,-55,-106,-3,-1,-3,0,1,-4,-2,-1,-2,-1,0,428,428,428,428,428,428,428,428,428,428,428,428,11.534087832,11.932041599,12.944983819,11.658543911,12.693375645,13.655605626,12.680020769,12.523584261,11.94707201,12.274308885,10.478150214,10.847310545,11.884365397,12.204611541,9.9030215158,10.46019391,10.657776077,12.304831697,12.001749686,12.10992082,1.0559376185,1.0847310545,1.0606184221,-0.54606763,2.7903541288,3.1954117165,2.0222446916,0.2187525635,-0.054677675,0.1643880654,0.0812259707,0.1898279345,0.3807348182,0.3276405783,0.0820692391,0.21848969,0.1639657858,0.1640644226,0.0820165127,0.0821940327,-1.326690854,-4.149096283,-4.160887656,-5.0238222,-1.422533477,-1.392871774,-5.328888039,1.6406442263,-1.585652578,-2.986383189,-1.245464883,-3.959268349,-3.780152838,-4.696181622,-1.340464238,-1.174382084,-5.164922253,1.8047086489,-1.503636065,-2.904189156 +050,2,3,39,033,Ohio,Crawford County,43784,43783,43754,43310,42774,42715,42406,42327,42096,41733,41454,41396,41338,-29,-444,-536,-59,-309,-79,-231,-363,-279,-58,-58,115,505,453,462,472,513,469,473,466,460,450,96,492,546,521,553,575,563,592,600,543,540,19,13,-93,-59,-81,-62,-94,-119,-134,-83,-90,0,2,4,13,22,32,40,32,19,32,23,-48,-460,-454,-6,-247,-46,-176,-276,-163,-7,8,-48,-458,-450,7,-225,-14,-136,-244,-144,25,31,0,1,7,-7,-3,-3,-1,0,-1,0,1,579,579,579,579,579,579,579,579,579,579,579,579,11.600661582,10.524603875,10.808408099,11.090095276,12.108623559,11.110716274,11.284877548,11.203673651,11.104405552,10.878236275,11.30203069,12.685284141,12.18870264,12.993268406,13.57204395,13.337597574,14.123990504,14.425330881,13.108026554,13.05388353,0.2986308922,-2.160680266,-1.380294541,-1.90317313,-1.463420391,-2.2268813,-2.839112956,-3.22165723,-2.003621002,-2.175647255,0.0459432142,0.0929324845,0.3041326954,0.5169112205,0.7553137503,0.9476090639,0.7634589462,0.4568021446,0.7724803862,0.555998743,-10.56693926,-10.547837,-0.140368936,-5.803503248,-1.085763516,-4.169479881,-6.584833411,-3.918881556,-0.168980084,0.1933908671,-10.52099605,-10.45490451,0.1637637591,-5.286592028,-0.330449766,-3.221870817,-5.821374465,-3.462079411,0.6035003018,0.7493896101 +050,2,3,39,035,Ohio,Cuyahoga County,1280122,1280119,1278103,1270424,1266271,1265698,1263498,1259109,1254324,1247808,1241788,1235574,1227883,-2016,-7679,-4153,-573,-2200,-4389,-4785,-6516,-6020,-6214,-7691,3801,15002,14858,14871,15135,14988,14647,14609,14315,13858,13702,3272,13764,13875,13792,13406,13545,13677,14107,14214,13721,14348,529,1238,983,1079,1729,1443,970,502,101,137,-646,518,2706,2991,4011,3732,4024,3878,3091,2715,1779,1749,-3134,-11661,-8109,-5550,-7583,-9843,-9614,-10093,-8816,-8126,-8799,-2616,-8955,-5118,-1539,-3851,-5819,-5736,-7002,-6101,-6347,-7050,71,38,-18,-113,-78,-13,-19,-16,-20,-4,5,29251,29236,28453,28820,29775,29760,29896,30185,30057,29967,30038,29818,11.773075192,11.714455226,11.746589314,11.96823022,11.882944906,11.654975486,11.677241648,11.499857808,11.187706924,11.124204725,10.801533592,10.939431031,10.8942882,10.600997313,10.738890362,10.883122805,11.275983841,11.418720146,11.077105405,11.648670953,0.9715416003,0.7750241949,0.8523011143,1.3672329072,1.1440545436,0.7718526812,0.4012578073,0.0811376625,0.1106015189,-0.524466228,2.1235796207,2.358186538,3.1682852357,2.9511354596,3.1903503003,3.0858192759,2.470692993,2.1810767691,1.4362051246,1.4199557776,-9.151168499,-6.393358287,-4.38393993,-5.99637197,-7.803831512,-7.650094512,-8.067520019,-7.08227359,-6.560203959,-7.143619718,-7.027588878,-4.035171749,-1.215654694,-3.04523651,-4.613481212,-4.564275236,-5.596827026,-4.901196821,-5.123998834,-5.723663941 +050,2,3,39,037,Ohio,Darke County,52959,52968,52964,52657,52524,52321,52203,52002,51653,51575,51323,51181,51205,-4,-307,-133,-203,-118,-201,-349,-78,-252,-142,24,157,602,625,596,656,616,603,640,639,626,612,150,554,520,598,566,644,603,627,643,619,646,7,48,105,-2,90,-28,0,13,-4,7,-34,3,2,6,13,12,18,18,17,9,14,13,-10,-357,-246,-217,-216,-188,-365,-105,-257,-163,45,-7,-355,-240,-204,-204,-170,-347,-88,-248,-149,58,-4,0,2,3,-4,-3,-2,-3,0,0,0,606,606,606,606,606,606,606,606,607,607,607,607,11.399248256,11.884275677,11.369164004,12.552141135,11.822849191,11.634749891,12.399736506,12.420066474,12.214157496,11.95475944,10.490338096,9.8877173634,11.407315561,10.830048601,12.360251427,11.634749891,12.147866858,12.497813369,12.07757746,12.618912742,0.9089101599,1.9965583138,-0.038151557,1.7220925338,-0.537402236,0,0.2518696478,-0.077746895,0.1365800359,-0.664153302,0.0378712567,0.1140890465,0.2479851209,0.2296123378,0.345472866,0.3473059669,0.3293680009,0.1749305137,0.2731600718,0.2539409685,-6.760019314,-4.677650907,-4.139443941,-4.133022081,-3.608272156,-7.042593218,-2.03433177,-4.995238003,-3.180363693,0.8790264294,-6.722148058,-4.56356186,-3.89145882,-3.903409743,-3.26279929,-6.695287251,-1.70496377,-4.820307489,-2.907203621,1.1329673979 +050,2,3,39,039,Ohio,Defiance County,39037,39026,39083,39015,38845,38587,38547,38349,38162,38158,38046,37978,37778,57,-68,-170,-258,-40,-198,-187,-4,-112,-68,-200,112,500,451,441,397,435,424,417,454,412,404,117,375,381,368,358,417,388,406,423,405,438,-5,125,70,73,39,18,36,11,31,7,-34,8,30,41,38,35,41,27,13,3,10,12,50,-222,-287,-373,-109,-258,-250,-26,-146,-86,-178,58,-192,-246,-335,-74,-217,-223,-13,-143,-76,-166,4,-1,6,4,-5,1,0,-2,0,1,0,720,828,839,806,814,757,748,722,765,736,724,724,12.804425209,11.584895967,11.390639529,10.29377447,11.313982522,11.083373633,10.927672956,11.915385019,10.838682521,10.665821849,9.603318907,9.7867968148,9.5051141647,9.2825472554,10.845817728,10.142332475,10.639412998,11.101779434,10.654530148,11.56344052,3.2011063023,1.7980991523,1.8855253642,1.011227215,0.468164794,0.9410411575,0.2882599581,0.813605585,0.1841523729,-0.89761867,0.7682655126,1.0531723606,0.981506354,0.9075116032,1.0663753641,0.7057808681,0.3406708595,0.0787360244,0.2630748185,0.3168065896,-5.685164793,-7.372206525,-9.634259738,-2.826250421,-6.710362047,-6.535008038,-0.681341719,-3.831819852,-2.262443439,-4.699297745,-4.91689928,-6.319034164,-8.652753384,-1.918738818,-5.643986683,-5.82922717,-0.34067086,-3.753083828,-1.99936862,-4.382491156 +050,2,3,39,041,Ohio,Delaware County,174214,174169,175114,178584,181234,185545,189649,193624,197442,201157,205347,209768,213554,945,3470,2650,4311,4104,3975,3818,3715,4190,4421,3786,555,2094,2109,2178,2249,2158,2207,2106,2080,2164,2118,249,923,904,992,992,1034,1117,1126,1212,1189,1372,306,1171,1205,1186,1257,1124,1090,980,868,975,746,73,248,309,358,326,505,543,391,253,318,257,542,2044,1146,2730,2493,2337,2190,2353,3070,3138,2790,615,2292,1455,3088,2819,2842,2733,2744,3323,3456,3047,24,7,-10,37,28,9,-5,-9,-1,-10,-7,2368,2262,2457,2381,2574,2497,2441,2436,2375,2263,2215,1896,11.840609786,11.722593089,11.876361515,11.988464634,11.260902803,11.287097319,10.567010956,10.233601637,10.426026523,10.006567105,5.2191417537,5.0247625188,5.4092518928,5.2879310437,5.3956318342,5.7125907136,5.6497883838,5.9630409541,5.7285330571,6.4820632993,6.621468032,6.6978305699,6.4671096219,6.7005335906,5.8652709687,5.574506605,4.9172225721,4.2705606833,4.6974934657,3.5245038056,1.4023262784,1.717534976,1.9521292113,1.7377676615,2.6351973658,2.77702485,1.9618714548,1.2447601992,1.5321055611,1.2142057346,11.557882714,6.3698869984,14.886348455,13.289125093,12.194962859,11.200155472,11.806351747,15.104402417,15.118702046,13.181455252,12.960208992,8.0874219744,16.838477666,15.026892754,14.830160225,13.977180323,13.768223202,16.349162616,16.650807608,14.395660986 +050,2,3,39,043,Ohio,Erie County,77079,77063,76977,76691,76440,76071,75833,75388,75004,74778,74413,74179,73719,-86,-286,-251,-369,-238,-445,-384,-226,-365,-234,-460,194,761,756,814,815,806,771,793,779,790,758,256,888,907,935,871,968,954,1011,994,891,991,-62,-127,-151,-121,-56,-162,-183,-218,-215,-101,-233,9,23,49,39,34,32,19,11,4,7,6,-26,-181,-135,-283,-214,-313,-216,-14,-150,-139,-233,-17,-158,-86,-244,-180,-281,-197,-3,-146,-132,-227,-7,-1,-14,-4,-2,-2,-4,-5,-4,-1,0,1677,1677,1677,1677,1677,1677,1678,1677,1679,1679,1679,1679,9.9044693755,9.8738988187,10.674639862,10.730461344,10.65989512,10.253204958,10.588722276,10.442989188,10.633143103,10.250307644,11.55738345,11.84606644,12.261410652,11.467769117,12.802454686,12.686845045,13.499619447,13.325200582,11.99257026,13.401127804,-1.652914074,-1.972167621,-1.58677079,-0.737307773,-2.142559565,-2.433640087,-2.910897171,-2.882211393,-1.359427156,-3.15082016,0.2993466434,0.6399749234,0.5114385192,0.4476511481,0.4232216425,0.2526730145,0.1468801325,0.0536225376,0.0942177237,0.0811369998,-2.355727933,-1.763196218,-3.711207716,-2.817568991,-4.139636691,-2.872493218,-0.18693835,-2.010845158,-1.870894799,-3.15082016,-2.05638129,-1.123221294,-3.199769197,-2.369917843,-3.716415048,-2.619820203,-0.040058218,-1.957222621,-1.776677075,-3.06968316 +050,2,3,39,045,Ohio,Fairfield County,146156,146180,146408,147180,147314,148820,150400,151310,152829,154718,156062,157703,159709,228,772,134,1506,1580,910,1519,1889,1344,1641,2006,416,1603,1658,1730,1647,1670,1699,1762,1808,1711,1720,274,1109,1138,1187,1190,1250,1269,1401,1431,1426,1530,142,494,520,543,457,420,430,361,377,285,190,24,95,162,216,171,219,231,151,100,128,100,79,188,-555,754,975,289,870,1388,880,1234,1724,103,283,-393,970,1146,508,1101,1539,980,1362,1824,-17,-5,7,-7,-23,-18,-12,-11,-13,-6,-8,2872,2872,2877,2880,3368,3372,3321,3338,3334,2893,2869,2705,10.920064853,11.259991715,11.683899856,11.008622418,11.070233005,11.17252309,11.458411235,11.635240363,10.906251494,10.83764949,7.5548046923,7.7285105978,8.0166411152,7.9540137691,8.2861025488,8.3448686291,9.1108025765,9.2090868138,9.0896052778,9.6404672791,3.3652601605,3.5314811168,3.667258741,3.0546086492,2.7841304564,2.8276544606,2.3476086582,2.4261535491,1.8166462161,1.1971822111,0.6471654155,1.1001921941,1.4587990572,1.1429717265,1.4517251666,1.51904228,0.9819637324,0.6435420555,0.8158972479,0.6300959006,1.2807062959,-3.769176961,5.0922893015,6.5169440545,1.9157469093,5.7210683273,9.0262626525,5.6631700882,7.8657594059,10.862853326,1.9278717114,-2.668984767,6.5510883586,7.659915781,3.3674720758,7.2401106073,10.008226385,6.3067121436,8.6816566539,11.492949227 +050,2,3,39,047,Ohio,Fayette County,29030,29034,29016,28870,28770,28690,28652,28617,28695,28669,28614,28486,28579,-18,-146,-100,-80,-38,-35,78,-26,-55,-128,93,86,355,374,364,329,347,358,326,311,344,321,101,348,340,377,350,358,355,417,372,339,344,-15,7,34,-13,-21,-11,3,-91,-61,5,-23,3,4,8,19,14,22,25,21,10,19,13,-1,-158,-141,-82,-28,-44,51,45,-2,-152,102,2,-154,-133,-63,-14,-22,76,66,8,-133,115,-5,1,-1,-4,-3,-2,-1,-1,-2,0,1,593,593,593,593,593,593,593,593,593,593,593,593,12.265487337,12.977099237,12.669683258,11.475009592,12.118248965,12.493020659,11.366013528,10.858369848,12.049036778,11.250328573,12.023632657,11.797362942,13.122171946,12.207457012,12.50240095,12.388330542,14.538735095,12.988146571,11.873905429,12.056426882,0.2418546799,1.1797362942,-0.452488688,-0.732447421,-0.384151984,0.1046901173,-3.172721568,-2.129776723,0.1751313485,-0.806098309,0.1382026742,0.2775850104,0.6613296206,0.4882982805,0.768303969,0.8724176438,0.7321665156,0.349143725,0.6654991243,0.4556207833,-5.459005632,-4.892435808,-2.854159415,-0.976596561,-1.536607938,1.7797319933,1.5689282477,-0.069828745,-5.323992995,3.5748707614,-5.320802958,-4.614850798,-2.192829795,-0.48829828,-0.768303969,2.6521496371,2.3010947633,0.27931498,-4.65849387,4.0304915447 +050,2,3,39,049,Ohio,Franklin County,1163414,1163473,1166218,1180917,1199257,1219186,1238758,1257891,1275212,1296374,1308599,1318766,1324624,2745,14699,18340,19929,19572,19133,17321,21162,12225,10167,5858,4506,17856,18128,18610,18876,18874,19048,18803,18647,18242,18195,1967,8577,8565,8934,8870,9553,9394,9719,10186,10043,10851,2539,9279,9563,9676,10006,9321,9654,9084,8461,8199,7344,953,4504,5374,7326,6266,7508,7657,6073,4110,5304,4178,-630,919,3465,2921,3313,2343,37,5959,-331,-3361,-5726,323,5423,8839,10247,9579,9851,7694,12032,3779,1943,-1548,-117,-3,-62,6,-13,-39,-27,46,-15,25,62,25285,25424,25537,25709,26161,27417,27773,27617,30950,30775,30762,30651,15.215145273,15.232499809,15.39006708,15.35917824,15.119466132,15.039262122,14.623660263,14.316463165,13.886155901,13.766413583,7.3084845993,7.1969528278,7.3882245726,7.2174142291,7.6526576223,7.41699015,7.5587594582,7.8204265457,7.6449218133,8.2099122717,7.9066606735,8.035546981,8.0018425078,8.1417640109,7.4668085101,7.6222719724,7.0649008044,6.4960366192,6.2412340881,5.5565013108,3.837870425,4.5156362518,6.0584433869,5.0985701871,6.0144617846,6.0455496677,4.7231552824,3.1555029553,4.0375052572,3.1610923852,0.7830823536,2.9115518445,2.4156037583,2.6957489674,1.876915818,0.0292131824,4.6344940438,-0.254129313,-2.558456857,-4.332315701,4.6209527786,7.4271880963,8.4740471452,7.7943191545,7.8913776025,6.0747628501,9.3576493261,2.9013736419,1.4790484002,-1.171223316 +050,2,3,39,051,Ohio,Fulton County,42698,42698,42630,42363,42330,42199,42401,42299,42337,42274,42256,42175,41889,-68,-267,-33,-131,202,-102,38,-63,-18,-81,-286,111,494,450,498,529,492,498,480,477,469,466,113,403,374,426,388,416,414,459,458,422,459,-2,91,76,72,141,76,84,21,19,47,7,8,12,6,24,8,28,32,43,12,47,36,-76,-371,-112,-232,58,-206,-77,-127,-48,-175,-328,-68,-359,-106,-208,66,-178,-45,-84,-36,-128,-292,2,1,-3,5,-5,0,-1,0,-1,0,-1,391,391,391,391,391,391,391,391,391,392,391,392,11.624486722,10.626616131,11.7829384,12.505910165,11.617473436,11.768041968,11.346042477,11.285933988,11.109663512,11.086791016,9.4831339051,8.8318987402,10.079381041,9.1725768322,9.8229043684,9.7830710336,10.849653118,10.836389448,9.9963283628,10.920251237,2.1413528173,1.794717391,1.703557359,3.3333333333,1.7945690673,1.9849709344,0.4963893584,0.4495445404,1.1133351494,0.1665397792,0.2823761957,0.1416882151,0.567852453,0.1891252955,0.6611570248,0.7561794036,1.0164163052,0.2839228676,1.1133351494,0.8564902931,-8.730130717,-2.644846682,-5.489240379,1.3711583924,-4.864226682,-1.81955669,-3.001973739,-1.13569147,-4.145396833,-7.803578226,-8.447754521,-2.503158466,-4.921387926,1.5602836879,-4.203069658,-1.063377286,-1.985557433,-0.851768603,-3.032061684,-6.947087933 +050,2,3,39,053,Ohio,Gallia County,30934,30937,31066,31023,30881,30684,30467,30258,30213,30156,29956,29850,29802,129,-43,-142,-197,-217,-209,-45,-57,-200,-106,-48,114,360,388,369,406,354,402,346,373,350,349,110,350,340,377,357,377,387,384,409,394,384,4,10,48,-8,49,-23,15,-38,-36,-44,-35,2,18,26,28,0,45,24,26,17,22,19,113,-69,-223,-218,-267,-229,-82,-44,-180,-84,-33,115,-51,-197,-190,-267,-184,-58,-18,-163,-62,-14,10,-2,7,1,1,-2,-2,-1,-1,0,1,921,1023,1014,960,906,933,951,953,910,882,883,883,11.596256986,12.535538899,11.987330464,13.278605419,11.659118979,13.29562931,11.462836886,12.410167687,11.704511253,11.701200295,11.274138736,10.984750582,12.247218387,11.67601511,12.416632359,12.799523739,12.721761169,13.607931861,13.175935525,12.874673104,0.3221182496,1.5507883174,-0.259887923,1.6025903092,-0.75751338,0.4961055713,-1.258924282,-1.197764174,-1.471424272,-1.173472809,0.5798128493,0.8400103386,0.9096077317,0,1.4820913956,0.793768914,0.8613692458,0.5656108597,0.7357121359,0.6370280963,-2.222615922,-7.204704058,-7.081945911,-8.732481889,-7.542198436,-2.71204379,-1.457701801,-5.988820868,-2.809082701,-1.10641722,-1.642803073,-6.364693719,-6.172338179,-8.732481889,-6.06010704,-1.918274876,-0.596332555,-5.423210008,-2.073370565,-0.469389124 +050,2,3,39,055,Ohio,Geauga County,93389,93397,93381,93287,93770,93847,93981,93899,93858,93891,93770,93494,93271,-16,-94,483,77,134,-82,-41,33,-121,-276,-223,234,916,930,903,918,905,914,934,908,956,912,220,751,746,783,764,856,846,876,885,832,919,14,165,184,120,154,49,68,58,23,124,-7,11,30,35,55,52,49,48,35,24,31,27,-44,-290,273,-98,-69,-175,-154,-56,-163,-429,-238,-33,-260,308,-43,-17,-126,-106,-21,-139,-398,-211,3,1,-9,0,-3,-5,-3,-4,-5,-2,-5,864,864,864,864,864,864,864,864,864,865,864,864,9.8142156127,9.9434931598,9.6259933801,9.7749004408,9.6338088141,9.7359885384,9.949453792,9.6770239954,10.210184552,9.7662838326,8.0463710973,7.9761783841,8.346791602,8.1351023277,9.1121992761,9.0116480344,9.3316076251,9.4319011409,8.8858509911,9.8412443445,1.7678445154,1.9673147757,1.2792017781,1.6397981132,0.521609538,0.7243405039,0.617846167,0.2451228545,1.3243335612,-0.074960512,0.3214262755,0.3742174845,0.586300815,0.5536980642,0.521609538,0.5112991793,0.3728382042,0.2557803699,0.3310833903,0.2891334029,-3.107120663,2.9188963792,-1.044681452,-0.734714739,-1.862891207,-1.6404182,-0.596541127,-1.737175012,-4.581766917,-2.548657404,-2.785694388,3.2931138637,-0.458380637,-0.181016675,-1.341281669,-1.129119021,-0.223702923,-1.481394642,-4.250683527,-2.259524001 +050,2,3,39,057,Ohio,Greene County,161573,161578,161599,163600,164403,164004,164796,164421,165494,166720,167643,169354,170122,21,2001,803,-399,792,-375,1073,1226,923,1711,768,427,1723,1759,1794,1838,1801,1908,1739,1747,1706,1713,284,1256,1349,1363,1333,1478,1441,1499,1540,1573,1683,143,467,410,431,505,323,467,240,207,133,30,86,292,585,662,541,666,528,374,211,305,258,-214,1239,-158,-1520,-224,-1380,87,623,516,1274,474,-128,1531,427,-858,317,-714,615,997,727,1579,732,6,3,-34,28,-30,16,-9,-11,-11,-1,6,8775,8700,8932,9163,8807,9077,8120,8212,8123,7965,8295,8406,10.59658855,10.725511657,10.925467484,11.180048662,10.941111789,11.566615643,10.469155424,10.449720812,10.124719211,10.092024178,7.7245009979,8.2255345226,8.300675686,8.1082725061,8.9788801915,8.7355834078,9.0243036115,9.2115455358,9.3353946771,9.9152811981,2.8720875525,2.4999771344,2.624791798,3.0717761557,1.962231598,2.8310322356,1.4448518124,1.2381752766,0.789324534,0.1767429804,1.7958234804,3.5670405454,4.0315827616,3.2907542579,4.0459636046,3.2008244548,2.251560741,1.2621013689,1.8101051345,1.5199896311,7.6199496308,-0.963405823,-9.256806341,-1.362530414,-8.38352819,0.5274085749,3.7505944963,3.0864659068,7.5608981682,2.7925390897,9.4157731112,2.6036347229,-5.225223579,1.9282238443,-4.337564585,3.7282330297,6.0021552373,4.3485672757,9.3710033027,4.3125287207 +050,2,3,39,059,Ohio,Guernsey County,40087,40092,40152,39915,39886,39716,39699,39402,39237,39077,39011,38876,38779,60,-237,-29,-170,-17,-297,-165,-160,-66,-135,-97,107,463,452,457,460,460,485,459,429,436,436,81,455,431,446,472,466,450,513,499,470,515,26,8,21,11,-12,-6,35,-54,-70,-34,-79,0,1,9,8,8,10,13,12,11,5,7,34,-246,-51,-186,-6,-300,-211,-116,-7,-106,-28,34,-245,-42,-178,2,-290,-198,-104,4,-101,-21,0,0,-8,-3,-7,-1,-2,-2,0,0,3,510,594,510,510,510,510,510,510,510,510,510,510,11.565314049,11.328178845,11.482123565,11.584713215,11.630699991,12.334846577,11.722042036,10.987603729,11.195706601,11.229154594,11.365481409,10.801869651,11.205748599,11.886923125,11.782404774,11.44470301,13.101105805,12.780452822,12.06876629,13.263794991,0.1998326402,0.5263091941,0.2763749655,-0.30220991,-0.151704782,0.8901435674,-1.379063769,-1.792849093,-0.873059689,-2.034640397,0.02497908,0.2255610832,0.2009999749,0.2014732733,0.2528413042,0.3306247536,0.3064586153,0.281733429,0.1283911307,0.1802845921,-6.144853685,-1.278179471,-4.673249416,-0.151104955,-7.585239125,-5.366294078,-2.962433281,-0.179284909,-2.721891972,-0.721138368,-6.119874605,-1.052618388,-4.472249441,0.0503683183,-7.332397821,-5.035669324,-2.655974666,0.1024485196,-2.593500841,-0.540853776 +050,2,3,39,061,Ohio,Hamilton County,802374,802371,802295,800746,802564,805408,807922,809902,811766,814693,815853,818653,817985,-76,-1549,1818,2844,2514,1980,1864,2927,1160,2800,-668,2663,10918,11071,10968,10937,11096,10819,10651,10737,10665,10619,1734,7684,7587,7621,7773,8157,7950,8126,8295,7850,8412,929,3234,3484,3347,3164,2939,2869,2525,2442,2815,2207,323,1557,1778,2519,2217,2593,2480,1969,1299,1727,1377,-1307,-6358,-3371,-2959,-2756,-3492,-3458,-1519,-2557,-1750,-4279,-984,-4801,-1593,-440,-539,-899,-978,450,-1258,-23,-2902,-21,18,-73,-63,-111,-60,-27,-48,-24,8,27,19511,19771,19660,19952,19911,20412,20857,21008,21955,22421,23837,23395,13.621610427,13.81018019,13.642028593,13.558292476,13.717190498,13.343051722,13.097163839,13.169821643,13.049814439,12.976602034,9.5867791279,9.4641709963,9.479020779,9.6359703223,10.083915185,9.804719585,9.9922592577,10.174505963,9.6053486497,10.279609785,4.0348312988,4.3460091935,4.1630078136,3.9223221536,3.633275313,3.538332137,3.1049045811,2.9953156795,3.4444657897,2.6969922487,1.9425579258,2.2179116952,3.1331391343,2.7483527859,3.2055402813,3.0585791913,2.4212107406,1.5933313136,2.1131767029,1.6827178643,-7.932423438,-4.205050801,-3.680412345,-3.416535985,-4.316909627,-4.264744695,-1.867861409,-3.136372724,-2.141319763,-5.229012158,-5.989865512,-1.987139106,-0.547273211,-0.668183199,-1.111369345,-1.206165504,0.5533493313,-1.543041411,-0.02814306,-3.546294294 +050,2,3,39,063,Ohio,Hancock County,74782,74790,74698,74926,75478,75612,75324,75726,75829,75984,75913,75690,75407,-92,228,552,134,-288,402,103,155,-71,-223,-283,220,874,885,925,955,940,884,939,894,870,848,172,714,660,735,685,744,781,773,828,783,762,48,160,225,190,270,196,103,166,66,87,86,21,40,99,162,151,217,195,148,94,127,101,-164,34,244,-210,-725,0,-192,-158,-231,-438,-470,-143,74,343,-48,-574,217,3,-10,-137,-311,-369,3,-6,-16,-8,16,-11,-3,-1,0,1,0,1694,1686,1694,1664,1682,1561,1583,1643,1588,1520,1529,1337,11.682617762,11.768304034,12.244357668,12.654370064,12.446209864,11.665731913,12.370482106,11.771134387,11.477345435,11.224577589,9.5439234347,8.7763623308,9.729300417,9.076694758,9.8510427011,10.306489393,10.183581116,10.902124466,10.329610892,10.086235994,2.1386943271,2.9919417037,2.5150572506,3.5776753061,2.5951671632,1.3592425192,2.18690099,0.8690099212,1.1477345435,1.1383415951,0.5346735818,1.3164543496,2.1444172348,2.0008480416,2.8732207878,2.573323216,1.9497671477,1.2376807969,1.6754285865,1.3368895478,0.4544725445,3.2445945587,-2.779800119,-9.606720729,0,-2.533733628,-2.081508171,-3.041534724,-5.778249771,-6.221169183,0.9891461263,4.5610489083,-0.635382884,-7.605872688,2.8732207878,0.0395895879,-0.131741023,-1.803853927,-4.102821184,-4.884279635 +050,2,3,39,065,Ohio,Hardin County,32058,32063,32126,31805,31630,31743,31780,31615,31374,31338,31417,31369,31469,63,-321,-175,113,37,-165,-241,-36,79,-48,100,106,372,369,402,402,358,347,382,388,389,368,54,317,311,336,318,308,320,331,324,321,349,52,55,58,66,84,50,27,51,64,68,19,5,22,19,22,22,3,8,5,-2,2,3,10,-400,-255,29,-68,-218,-277,-92,17,-118,77,15,-378,-236,51,-46,-215,-269,-87,15,-116,80,-4,2,3,-4,-1,0,1,0,0,0,1,2259,2259,2031,2111,2180,2153,2144,1934,1961,1889,1875,1856,11.63754673,11.633956018,12.686790905,12.656832958,11.294266109,11.017796758,12.182676362,12.365548562,12.391297423,11.712657946,9.9169417028,9.8053125246,10.603884935,10.012121594,9.7168546415,10.160504215,10.556193392,10.325870449,10.225209442,11.107928324,1.7206050273,1.8286434933,2.0829059694,2.6447113644,1.5774114678,0.8572925431,1.6264829698,2.0396781133,2.1660879814,0.6047296222,0.6882420109,0.5990383857,0.6943019898,0.6926625002,0.0946446881,0.2540126054,0.1594591147,-0.063739941,0.06370847,0.0954836246,-12.51349111,-8.039725703,0.9152162593,-2.140956819,-6.877514,-8.795186461,-2.93404771,0.5417894988,-3.758799732,2.4507463637,-11.8252491,-7.440687318,1.6095182491,-1.448294319,-6.782869311,-8.541173856,-2.774588595,0.4780495578,-3.695091262,2.5462299882 +050,2,3,39,067,Ohio,Harrison County,15864,15852,15816,15784,15679,15598,15517,15396,15237,15203,15151,15053,15014,-36,-32,-105,-81,-81,-121,-159,-34,-52,-98,-39,45,152,163,160,161,175,138,159,155,135,135,65,196,206,186,199,229,194,191,223,183,209,-20,-44,-43,-26,-38,-54,-56,-32,-68,-48,-74,0,3,2,1,1,3,3,2,1,2,1,-13,8,-61,-53,-43,-69,-107,-3,18,-53,35,-13,11,-59,-52,-42,-66,-104,-1,19,-51,36,-3,1,-3,-3,-1,-1,1,-1,-3,1,-1,232,232,232,232,232,232,232,232,232,232,232,232,9.6202531646,10.361376855,10.231160278,10.348706412,11.322097499,9.0098912937,10.446780552,10.212822033,8.9392133492,8.97994479,12.405063291,13.09474621,11.893723823,12.791258236,14.815773299,12.666079065,12.549277267,14.693285893,12.117600318,13.902284897,-2.784810127,-2.733369354,-1.662563545,-2.442551824,-3.4936758,-3.656187771,-2.102496715,-4.48046386,-3.178386969,-4.922340107,0.1898734177,0.1271334583,0.0639447517,0.0642776796,0.1940931,0.195867202,0.1314060447,0.0658891744,0.1324327904,0.0665181096,0.5063291139,-3.87757048,-3.389071842,-2.763940222,-4.4641413,-6.985930206,-0.197109067,1.1860051394,-3.509468945,2.3281338344,0.6962025316,-3.750437021,-3.32512709,-2.699662542,-4.2700482,-6.790063004,-0.065703022,1.2518943138,-3.377036154,2.394651944 +050,2,3,39,069,Ohio,Henry County,28215,28215,28170,27999,27826,27831,27605,27490,27268,27189,27039,26942,26904,-45,-171,-173,5,-226,-115,-222,-79,-150,-97,-38,89,324,346,356,294,313,271,323,317,316,300,81,282,292,250,265,292,298,271,319,281,273,8,42,54,106,29,21,-27,52,-2,35,27,3,-2,10,11,0,1,2,1,-2,2,-1,-58,-213,-240,-112,-259,-136,-198,-131,-146,-134,-64,-55,-215,-230,-101,-259,-135,-196,-130,-148,-132,-65,2,2,3,0,4,-1,1,-1,0,0,0,346,346,346,346,346,346,346,346,346,346,346,346,11.536612722,12.395879982,12.792640638,10.606825889,11.362192576,9.8980970817,11.862570468,11.691377148,11.707823123,11.14288898,10.041125888,10.461262875,8.9835959538,9.560574356,10.599872947,10.884254356,9.9528068017,11.76513978,10.411070562,10.140028972,1.4954868344,1.934617107,3.8090446844,1.0462515333,0.7623196297,-0.986157274,1.9097636667,-0.073762632,1.2967525611,1.0028600082,-0.071213659,0.3582624272,0.395278222,0,0.0363009347,0.0730486869,0.0367262244,-0.073762632,0.0741001463,-0.037142963,-7.58425466,-8.598298253,-4.024650987,-9.344108522,-4.936927126,-7.231820008,-4.811135391,-5.384672125,-4.964709805,-2.377149649,-7.655468319,-8.240035826,-3.629372765,-9.344108522,-4.900626191,-7.158771321,-4.774409167,-5.458434757,-4.890609659,-2.414292612 +050,2,3,39,071,Ohio,Highland County,43589,43605,43619,43376,42966,43200,43102,42973,43011,42931,43032,43123,43304,14,-243,-410,234,-98,-129,38,-80,101,91,181,133,546,495,543,585,516,551,548,547,559,543,97,480,437,513,471,498,487,512,479,514,518,36,66,58,30,114,18,64,36,68,45,25,0,-2,6,18,13,15,10,9,2,8,3,-19,-307,-484,191,-219,-160,-33,-126,34,38,153,-19,-309,-478,209,-206,-145,-23,-117,36,46,156,-3,0,10,-5,-6,-2,-3,1,-3,0,0,484,484,484,484,484,484,484,484,484,484,484,484,12.552445543,11.466030437,12.603579138,13.557043869,11.989544002,12.816337923,12.752786763,12.726405547,12.97661192,12.56551772,11.035116961,10.122535962,11.907248799,10.915158397,11.571304095,11.327688872,11.91501245,11.144329537,11.931983054,11.986994805,1.5173285821,1.3434944755,0.6963303391,2.6418854719,0.4182399071,1.488649051,0.8377743129,1.5820760094,1.0446288666,0.5785229153,-0.045979654,0.1389821871,0.4177982035,0.3012676415,0.3485332559,0.2326014142,0.2094435782,0.0465316473,0.1857117985,0.0694227498,-7.057876889,-11.21122976,4.433303159,-5.075201038,-3.717688063,-0.767584667,-2.932210095,0.7910380047,0.8821310429,3.5405602416,-7.103856543,-11.07224757,4.8511013625,-4.773933397,-3.369154807,-0.534983253,-2.722766517,0.8375696521,1.0678428414,3.6099829914 +050,2,3,39,073,Ohio,Hocking County,29380,29373,29483,29471,29310,28660,28749,28502,28403,28440,28353,28240,28095,110,-12,-161,-650,89,-247,-99,37,-87,-113,-145,82,315,307,335,316,310,316,287,322,288,291,42,311,299,318,308,289,277,328,350,334,349,40,4,8,17,8,21,39,-41,-28,-46,-58,1,6,6,3,3,7,9,5,1,5,1,70,-21,-180,-680,83,-274,-146,75,-58,-73,-88,71,-15,-174,-677,86,-267,-137,80,-57,-68,-87,-1,-1,5,10,-5,-1,-1,-2,-2,1,0,718,789,800,787,310,311,311,310,309,311,310,308,10.686297791,10.445552134,11.55770226,11.008726855,10.829505161,11.106229681,10.097989198,11.339425633,10.177937201,10.331055294,10.550598772,10.173355336,10.971191996,10.730024909,10.095893522,9.7355241191,11.540559084,12.325462645,11.803579948,12.390165971,0.1356990196,0.2721967983,0.5865102639,0.2787019457,0.73361164,1.3707055619,-1.442569885,-0.986037012,-1.625642747,-2.059110677,0.2035485294,0.2041475987,0.1035018113,0.1045132296,0.2445372133,0.3163166681,0.1759231568,0.0352156076,0.1767002986,0.0355019082,-0.712419853,-6.124427961,-23.46041056,2.8915326865,-9.571885207,-5.131359283,2.6388473515,-2.042505238,-2.57982436,-3.124167924,-0.508871323,-5.920280363,-23.35690875,2.9960459161,-9.327347994,-4.815042615,2.8147705082,-2.007289631,-2.403124061,-3.088666016 +050,2,3,39,075,Ohio,Holmes County,42366,42364,42471,42795,43130,43607,43791,43885,43866,43908,43973,44021,44004,107,324,335,477,184,94,-19,42,65,48,-17,211,784,792,806,785,736,724,702,739,773,809,50,284,287,298,299,329,317,337,336,324,366,161,500,505,508,486,407,407,365,403,449,443,2,5,0,0,0,1,6,5,1,3,1,-55,-181,-173,-24,-300,-314,-432,-329,-339,-405,-460,-53,-176,-173,-24,-300,-313,-426,-324,-338,-402,-459,-1,0,3,-7,-2,0,0,1,0,1,-1,765,765,765,765,765,765,765,765,765,765,765,765,18.389510473,18.434681408,18.584917625,17.963797799,16.789087093,16.501236453,15.995625128,16.818197335,17.56937973,18.381141721,6.6615063449,6.6802443992,6.8713467148,6.8422618367,7.5049044208,7.224988889,7.6788114932,7.6467040657,7.364138464,8.3158193695,11.728004128,11.754437009,11.71357091,11.121535962,9.2841826726,9.2762475641,8.316813635,9.1714932693,10.205241266,10.065322352,0.1172800413,0,0,0,0.0228112596,0.1367505783,0.1139289539,0.0227580478,0.0681864673,0.0227208179,-4.245537494,-4.02676753,-0.553397051,-6.865145656,-7.162735526,-9.846041641,-7.496525167,-7.714978209,-9.20517308,-10.45157626,-4.128257453,-4.02676753,-0.553397051,-6.865145656,-7.139924267,-9.709291062,-7.382596213,-7.692220161,-9.136986613,-10.42885544 +050,2,3,39,077,Ohio,Huron County,59626,59625,59566,59428,59220,58840,58626,58325,58386,58403,58316,58269,57979,-59,-138,-208,-380,-214,-301,61,17,-87,-47,-290,172,736,713,731,753,722,772,755,709,700,686,150,522,600,582,605,575,570,613,641,616,658,22,214,113,149,148,147,202,142,68,84,28,13,50,25,44,10,15,10,9,-3,7,7,-95,-403,-351,-584,-373,-465,-150,-133,-150,-138,-325,-82,-353,-326,-540,-363,-450,-140,-124,-153,-131,-318,1,1,5,11,1,2,-1,-1,-2,0,0,578,578,578,578,578,578,578,578,578,578,578,578,12.370371615,12.018744522,12.383533796,12.820731105,12.347051329,13.229258596,12.929299848,12.148836094,12.008405884,11.802353589,8.7735516076,10.113950509,9.8593935287,10.300853013,9.8331779976,9.767716839,10.497563983,10.983644479,10.567397178,11.320624871,3.5968200077,1.9047940125,2.5241402677,2.5198780924,2.5138733316,3.461541757,2.4317358655,1.165191614,1.4410087061,0.4817287179,0.8403785065,0.4214146045,0.7453837032,0.1702620333,0.2565176869,0.1713634533,0.1541241042,-0.051405512,0.1200840588,0.1204321795,-6.773450762,-5.916661048,-9.893274606,-6.350773841,-7.952048294,-2.5704518,-2.277611761,-2.570275619,-2.367371446,-5.591494047,-5.933072256,-5.495246443,-9.147890903,-6.180511808,-7.695530607,-2.399088346,-2.123487657,-2.621681132,-2.247287387,-5.471061868 +050,2,3,39,079,Ohio,Jackson County,33225,33219,33249,33126,32869,32807,32772,32575,32565,32398,32370,32372,32493,30,-123,-257,-62,-35,-197,-10,-167,-28,2,121,128,399,391,473,434,408,444,375,439,377,376,132,388,384,411,405,391,410,421,464,433,419,-4,11,7,62,29,17,34,-46,-25,-56,-43,1,-1,-2,27,22,32,28,18,13,16,16,34,-134,-265,-151,-80,-246,-71,-139,-15,42,148,35,-135,-267,-124,-58,-214,-43,-121,-2,58,164,-1,1,3,0,-6,0,-1,0,-1,0,0,325,325,325,325,325,325,325,325,325,325,325,325,12.02259887,11.849382529,14.404044095,13.235944433,12.487183803,13.63217685,11.545033327,13.556077075,11.646226561,11.593309181,11.691148776,11.637245246,12.515987575,12.351514967,11.966884478,12.588271415,12.961224081,14.328063241,13.376170029,12.919139752,0.3314500942,0.2121372831,1.8880565199,0.8844294668,0.5202993251,1.0439054344,-1.416190755,-0.771986166,-1.729943468,-1.325830571,-0.030131827,-0.060610652,0.8222181619,0.670946492,0.979386965,0.8596868284,0.5541615997,0.4014328063,0.4942695623,0.4933323056,-4.037664783,-8.030911433,-4.598331202,-2.439805426,-7.529037293,-2.179920172,-4.27935902,-0.4631917,1.2974576009,4.5633238264,-4.06779661,-8.091522085,-3.77611304,-1.768858934,-6.549650328,-1.320233344,-3.72519742,-0.061758893,1.7917271632,5.056656132 +050,2,3,39,081,Ohio,Jefferson County,69709,69718,69669,69046,68557,68200,67916,67546,66993,66398,65889,65494,64939,-49,-623,-489,-357,-284,-370,-553,-595,-509,-395,-555,160,629,668,670,657,708,649,648,659,666,659,200,1002,991,946,905,1026,905,973,922,912,990,-40,-373,-323,-276,-248,-318,-256,-325,-263,-246,-331,0,-3,-9,3,-1,1,1,-5,-8,-7,-6,0,-244,-149,-74,-23,-44,-296,-260,-237,-141,-219,0,-247,-158,-71,-24,-43,-295,-265,-245,-148,-225,-9,-3,-8,-10,-12,-9,-2,-5,-1,-1,1,2212,2214,2331,2351,2359,2362,2340,2290,2421,2445,2441,2353,9.0689543308,9.7090906448,9.7984015443,9.653530812,10.453116003,9.647760129,9.7157979174,9.9631861029,10.138297953,10.104804766,14.446887503,14.403755732,13.834758001,13.29748156,15.148159631,13.4533481,14.588690391,13.939389358,13.883074675,15.180207463,-5.377933172,-4.694665087,-4.036356457,-3.643950748,-4.695043628,-3.805587971,-4.872892474,-3.976203255,-3.744776721,-5.075402697,-0.043254154,-0.130811102,0.0438734398,-0.01469335,0.0147642881,0.014865578,-0.074967577,-0.120949148,-0.106558687,-0.092001257,-3.518004542,-2.165650458,-1.082211514,-0.337947045,-0.649628678,-4.400211091,-3.898313979,-3.583118523,-2.146396414,-3.358045893,-3.561258696,-2.29646156,-1.038338074,-0.352640395,-0.63486439,-4.385345513,-3.973281556,-3.704067671,-2.252955101,-3.450047151 +050,2,3,39,083,Ohio,Knox County,60921,60926,61087,61290,60781,60882,61035,61045,60953,61345,61921,62239,62423,161,203,-509,101,153,10,-92,392,576,318,184,188,680,738,741,698,746,743,731,808,712,738,122,616,634,622,570,600,632,657,624,612,646,66,64,104,119,128,146,111,74,184,100,92,5,7,9,13,5,13,14,11,5,10,10,89,134,-637,-24,34,-144,-212,309,389,209,84,94,141,-628,-11,39,-131,-198,320,394,219,94,1,-2,15,-7,-14,-5,-5,-2,-2,-1,-2,3485,3530,3579,3589,3541,3565,3557,3553,3608,3574,3626,3559,11.113199376,12.091323902,12.181189022,11.450412986,12.221494102,12.18052755,11.95440645,13.109859978,11.469072165,11.840015402,10.067251199,10.387397498,10.224965684,9.350623785,9.8296199214,10.360825587,10.744247657,10.124446319,9.8582474227,10.364024322,1.0459481765,1.7039264035,1.9562233382,2.0997892008,2.3918741809,1.8197019623,1.2101587925,2.9854136583,1.6108247423,1.4759910799,0.1144005818,0.1474551695,0.2137050706,0.0820230157,0.2129750983,0.2295119592,0.1798884691,0.0811253711,0.1610824742,0.160433813,2.1899539946,-10.43654922,-0.394532438,0.5577565065,-2.359108781,-3.475466811,5.0532306334,6.3115538754,3.3666237113,1.3476440295,2.3043545764,-10.28909405,-0.180827367,0.6397795221,-2.146133683,-3.245954852,5.2331191025,6.3926792465,3.5277061856,1.5080778425 +050,2,3,39,085,Ohio,Lake County,230041,230051,230010,229991,229572,230085,229865,229843,229499,230114,229856,229739,229569,-41,-19,-419,513,-220,-22,-344,615,-258,-117,-170,577,2371,2205,2282,2255,2301,2234,2230,2183,2189,2185,542,2385,2338,2449,2190,2509,2473,2594,2586,2518,2694,35,-14,-133,-167,65,-208,-239,-364,-403,-329,-509,40,132,198,356,285,382,330,249,161,155,157,-95,-131,-450,368,-543,-169,-422,749,-5,55,171,-55,1,-252,724,-258,213,-92,998,156,210,328,-21,-6,-34,-44,-27,-27,-13,-19,-11,2,11,2786,2775,2788,2761,2763,2772,2815,2803,2801,2810,2812,2811,10.308673242,9.5960727909,9.9291428174,9.8054136319,10.010702446,9.7269572562,9.7038160365,9.4919233863,9.5257781307,9.5143128358,10.369542675,10.174883531,10.655771586,9.5227742146,10.915624701,10.767576229,11.287757309,11.244211579,10.957473428,11.730690517,-0.060869433,-0.57881074,-0.726628769,0.2826394173,-0.904922255,-1.040618972,-1.583941272,-1.752288193,-1.431695297,-2.216377681,0.5739117958,0.861688169,1.5489810881,1.2392651375,1.661924526,1.4368379116,1.083520266,0.7000456552,0.6745069028,0.6836371237,-0.569563979,-1.958382202,1.6011939337,-2.361126209,-0.735249332,-1.837410905,3.2592637719,-0.021740548,0.2393411591,0.7445983958,0.0043478166,-1.096694033,3.1501750218,-1.121861072,0.9266751938,-0.400572994,4.3427840379,0.6783051069,0.9138480619,1.4282355195 +050,2,3,39,087,Ohio,Lawrence County,62450,62451,62428,62432,62177,61908,61599,60990,60817,60176,59864,59556,59091,-23,4,-255,-269,-309,-609,-173,-641,-312,-308,-465,161,737,739,684,722,687,710,604,625,608,612,138,696,698,761,756,796,799,844,886,849,829,23,41,41,-77,-34,-109,-89,-240,-261,-241,-217,-2,-16,-21,-10,-12,-11,-3,-8,-10,-10,-4,-36,-19,-274,-177,-257,-489,-79,-393,-39,-57,-244,-38,-35,-295,-187,-269,-500,-82,-401,-49,-67,-248,-8,-2,-1,-5,-6,0,-2,0,-2,0,0,669,669,669,669,669,669,669,669,669,669,669,669,11.805221848,11.861101526,11.02470081,11.691645008,11.208183442,11.657786498,9.984048664,10.413195601,10.182548987,10.316316468,11.148486305,11.203043119,12.26578555,12.242221089,12.98648329,13.119114665,13.951220319,14.761746085,14.218723832,13.974226066,0.6567355438,0.6580584067,-1.24108474,-0.550576081,-1.778299847,-1.461328167,-3.967171655,-4.348550483,-4.036174845,-3.657909597,-0.256287041,-0.337054306,-0.161179836,-0.19432097,-0.179461452,-0.049258253,-0.132239055,-0.16661113,-0.167476135,-0.067426905,-0.304340862,-4.397756181,-2.852883104,-4.161707434,-7.977877297,-1.297133991,-6.496243584,-0.649783406,-0.954613968,-4.113041206,-0.560627903,-4.734810487,-3.014062941,-4.356028403,-8.15733875,-1.346392243,-6.628482639,-0.816394535,-1.122090102,-4.180468111 +050,2,3,39,089,Ohio,Licking County,166492,166504,166725,167195,167636,168532,169506,170721,172166,173790,175816,177174,178100,221,470,441,896,974,1215,1445,1624,2026,1358,926,495,1952,1959,1956,1959,1971,2026,1968,1974,1999,1980,360,1454,1515,1506,1497,1646,1606,1647,1755,1688,1826,135,498,444,450,462,325,420,321,219,311,154,13,67,149,149,156,168,171,141,84,120,101,89,-89,-127,329,396,741,863,1168,1726,928,666,102,-22,22,478,552,909,1034,1309,1810,1048,767,-16,-6,-25,-32,-40,-19,-9,-6,-3,-1,5,3448,3448,3418,3488,3452,3418,3404,3436,3539,3600,3553,3485,11.691423095,11.701425495,11.637038624,11.590412912,11.586382033,11.817304243,11.377169351,11.292712368,11.32609989,11.146326497,8.708672736,9.0493413095,8.9598058114,8.8569924091,9.6758928598,9.3675175787,9.5214420331,10.039873458,9.5640103119,10.279389992,2.9827503594,2.6520841858,2.6772328122,2.733420503,1.9104891734,2.4497866644,1.8557273179,1.2528389101,1.7620895776,0.8669365053,0.401293723,0.8900012245,0.8864615311,0.9229731569,0.9875759419,0.9974131419,0.8151325602,0.4805409518,0.6799059463,0.5685752405,-0.533061811,-0.758591648,1.957354656,2.3429318597,4.3559153154,5.0337283128,6.7523037612,9.8739724147,5.2579393184,3.7492189127,-0.131768088,0.1314095768,2.8438161871,3.2659050166,5.3434912573,6.0311414548,7.5674363214,10.354513366,5.9378452647,4.3177941532 +050,2,3,39,091,Ohio,Logan County,45858,45848,45743,45625,45412,45399,45477,45255,45145,45217,45291,45594,45326,-105,-118,-213,-13,78,-222,-110,72,74,303,-268,123,584,515,553,560,548,545,490,566,556,542,149,448,432,466,484,530,497,508,530,476,544,-26,136,83,87,76,18,48,-18,36,80,-2,1,9,13,31,24,9,19,11,8,11,7,-81,-264,-309,-128,-11,-246,-176,83,32,213,-273,-80,-255,-296,-97,13,-237,-157,94,40,224,-266,1,1,0,-3,-11,-3,-1,-4,-2,-1,0,450,450,450,450,450,450,450,450,450,450,450,450,12.783469048,11.314081088,12.179141293,12.324486113,12.079530926,12.057522124,10.845266816,12.507181686,12.235242339,11.922569292,9.8064968041,9.4906466601,10.263073857,10.651877283,11.682758013,10.995575221,11.243664372,11.711671896,10.474775816,11.966564012,2.9769722441,1.8234344278,1.9160674368,1.6726088296,0.3967729136,1.0619469027,-0.398397556,0.7955097892,1.7604665236,-0.043994721,0.1970055162,0.2855981634,0.6827366729,0.528192262,0.1983864568,0.4203539823,0.2434651734,0.1767799532,0.242064147,0.1539815222,-5.778828474,-6.788448653,-2.819041746,-0.24208812,-5.422563153,-3.89380531,1.8370553994,0.7071198126,4.6872421192,-6.005279366,-5.581822958,-6.502850489,-2.136305073,0.2861041419,-5.224176696,-3.473451327,2.0805205728,0.8838997658,4.9293062662,-5.851297844 +050,2,3,39,093,Ohio,Lorain County,301356,301374,301479,301899,301757,303159,304551,305533,306676,307498,309222,310100,312172,105,420,-142,1402,1392,982,1143,822,1724,878,2072,821,3478,3318,3396,3367,3460,3304,3261,3246,3197,3204,718,2897,2785,2972,2918,3032,3049,3224,3266,3204,3323,103,581,533,424,449,428,255,37,-20,-7,-119,84,393,492,592,588,615,575,477,502,199,252,-54,-547,-1167,439,423,-25,331,329,1259,689,1937,30,-154,-675,1031,1011,590,906,806,1761,888,2189,-28,-7,0,-53,-68,-36,-18,-21,-17,-3,2,9332,9307,9175,8677,8850,8844,8976,9001,8752,8625,8381,8447,11.528428282,10.99301589,11.228005211,11.080943213,11.342700349,10.793699537,10.619140504,10.526657154,10.324193231,10.297747609,9.6026040061,9.2271094796,9.8261576814,9.6032647151,9.9396148727,9.9606506928,10.498653476,10.591516409,10.346798596,10.680217011,1.925824276,1.7659064103,1.4018475292,1.477678498,1.4030854768,0.8330488444,0.1204870281,-0.064859255,-0.022605365,-0.382469402,1.3026659905,1.6300674556,1.9572965503,1.9351335341,2.0161158136,1.8784434727,1.5533057407,1.6279673109,0.6426382399,0.8099352052,-1.813125437,-3.866440489,1.4514411918,1.3921113689,-0.081955927,1.0813300687,1.0713576283,4.0828901284,2.2250138054,6.2255733827,-0.510459447,-2.236373034,3.4087377421,3.327244903,1.9341598862,2.9597735414,2.624663369,5.7108574394,2.8676520453,7.0355085879 +050,2,3,39,095,Ohio,Lucas County,441815,441813,441447,439409,436846,436269,434736,433826,433113,431312,429990,428888,428294,-366,-2038,-2563,-577,-1533,-910,-713,-1801,-1322,-1102,-594,1470,5601,5665,5633,5807,5662,5574,5460,5488,5317,5238,1047,4198,4298,4470,4373,4520,4501,4529,4723,4699,4808,423,1403,1367,1163,1434,1142,1073,931,765,618,430,108,347,434,613,499,678,676,520,319,398,339,-906,-3802,-4445,-2352,-3490,-2723,-2454,-3259,-2400,-2128,-1379,-798,-3455,-4011,-1739,-2991,-2045,-1778,-2739,-2081,-1730,-1040,9,14,81,-1,24,-7,-8,7,-6,10,16,10715,10821,10940,10485,10253,10111,10122,10354,9656,9825,9253,9462,12.717175111,12.930026077,12.903225806,13.334022193,13.037641527,12.859036218,12.632674899,12.743497635,12.381269517,12.221441887,9.5316374072,9.8099297579,10.239201022,10.04127416,10.408007719,10.383660211,10.478641872,10.967117225,10.942182708,11.218154371,3.1855377042,3.120096319,2.6640247848,3.2927480324,2.6296338085,2.4753760068,2.1540330277,1.7763804101,1.4390868086,1.0032875165,0.787869981,0.9905792264,1.4041678359,1.145802837,1.5612011578,1.559509954,1.2031118952,0.7407390207,0.9267905337,0.7909638793,-8.632512011,-10.14544853,-5.387606444,-8.013731264,-6.270133853,-5.661297969,-7.540272435,-5.572958149,-4.95530215,-3.217519733,-7.84464203,-9.154869302,-3.983438608,-6.867928428,-4.708932696,-4.101788015,-6.33716054,-4.832219129,-4.028511616,-2.426555854 +050,2,3,39,097,Ohio,Madison County,43435,43438,43434,43120,42996,43263,43988,44149,43400,44077,44393,44812,44559,-4,-314,-124,267,725,161,-749,677,316,419,-253,89,430,429,405,438,423,412,424,443,440,449,120,376,375,432,382,401,429,437,447,399,442,-31,54,54,-27,56,22,-17,-13,-4,41,7,8,45,54,55,37,52,51,53,23,50,38,22,-416,-236,245,620,91,-789,635,299,326,-297,30,-371,-182,300,657,143,-738,688,322,376,-259,-3,3,4,-6,12,-4,6,2,-2,2,-1,5238,5275,4977,4962,4863,5146,5220,4495,4939,4827,4887,4598,9.9359937149,9.9633053091,9.3903244879,10.039999542,9.5986929439,9.4118722087,9.6939767024,10.014694247,9.8649178858,10.048002148,8.68821776,8.7091829625,10.01634612,8.7563466321,9.0994701431,9.8002261591,9.9911976862,10.10512038,8.945686901,9.8913517808,1.2477759549,1.2541223466,-0.626021633,1.2836529094,0.4992228009,-0.38835395,-0.297220984,-0.090426133,0.9192309848,0.1566503676,1.0398132957,1.2541223466,1.2752292514,0.8481278152,1.1799811657,1.1650618511,1.2117470878,0.5199502656,1.1210133961,0.8503877097,-9.612496245,-5.480979144,5.6805666655,14.211871497,2.0649670399,-18.02419217,14.518101901,6.7593534531,7.3090073426,-6.64645131,-8.572682949,-4.226856798,6.9557959169,15.059999312,3.2449482056,-16.85913032,15.729848989,7.2793037188,8.4300207387,-5.7960636 +050,2,3,39,099,Ohio,Mahoning County,238823,238788,238315,237304,235689,234431,233472,231988,230263,229438,228975,227510,226075,-473,-1011,-1615,-1258,-959,-1484,-1725,-825,-463,-1465,-1435,606,2340,2330,2400,2419,2431,2381,2519,2418,2361,2350,776,3008,3037,3077,2966,3231,3019,3020,3033,3020,3116,-170,-668,-707,-677,-547,-800,-638,-501,-615,-659,-766,48,219,236,315,326,300,292,318,406,40,130,-344,-556,-1136,-885,-706,-970,-1375,-632,-246,-848,-802,-296,-337,-900,-570,-380,-670,-1083,-314,160,-808,-672,-7,-6,-8,-11,-32,-14,-4,-10,-8,2,3,7925,7940,7975,8053,7881,7856,7885,7932,8008,8691,8805,8974,9.8398087545,9.8521542602,10.210159108,10.339749905,10.445580716,10.301762462,10.959297456,10.549439043,10.344261038,10.361894683,12.648779801,12.841627677,13.090274823,12.677841347,13.883040433,13.062167524,13.138975116,13.232609023,13.231541014,13.739431419,-2.808971046,-2.989473417,-2.880115715,-2.338091442,-3.437459717,-2.760405061,-2.17967766,-2.68316998,-2.887279976,-3.377536735,0.9209051783,0.9979006032,1.340083383,1.3934512068,1.289047394,1.2633828807,1.3835079758,1.7713284745,0.1752521989,0.5732111953,-2.338005841,-4.803453751,-3.764996171,-3.017719485,-4.167919907,-5.949148839,-2.749613336,-1.073267992,-3.715346616,-3.536272143,-1.417100663,-3.805553148,-2.424912788,-1.624268278,-2.878872513,-4.685765958,-1.36610536,0.6980604826,-3.540094417,-2.963060948 +050,2,3,39,101,Ohio,Marion County,66501,66505,66459,66614,66301,65996,65822,65470,65481,65113,65426,65057,64820,-46,155,-313,-305,-174,-352,11,-368,313,-369,-237,192,807,780,781,746,763,724,746,739,746,722,186,623,694,715,683,794,753,775,785,771,808,6,184,86,66,63,-31,-29,-29,-46,-25,-86,6,15,2,16,11,58,76,49,46,34,29,-52,-44,-398,-388,-246,-378,-32,-389,318,-379,-178,-46,-29,-396,-372,-235,-320,44,-340,364,-345,-149,-6,0,-3,1,-2,-1,-4,1,-5,1,-2,5457,5457,5805,6036,6076,6117,6041,6271,6022,6020,5831,5466,12.12868125,11.736824286,11.806768105,11.318636302,11.622947324,11.057571153,11.424720891,11.322286826,11.434439735,11.118211847,9.3632818077,10.442764173,10.809013054,10.362772914,12.095177162,11.500484914,11.868845429,12.027057048,11.817631416,12.44254179,2.7653994424,1.2940601136,0.9977550511,0.9558633874,-0.472229839,-0.442913762,-0.444124539,-0.704770222,-0.38319168,-1.324329943,0.2254401719,0.0300944212,0.2418800124,0.1668967819,0.8835267952,1.1607395133,0.7504173239,0.7047702219,0.521140685,0.4465763761,-0.661291171,-5.988789828,-5.865590301,-3.732418941,-5.75815739,-0.488732427,-5.957394674,4.8721071864,-5.809185871,-2.741054998,-0.435850999,-5.958695407,-5.623710288,-3.565522159,-4.874630594,0.6720070866,-5.20697735,5.5768774083,-5.288045186,-2.294478622 +050,2,3,39,103,Ohio,Medina County,172332,172329,172503,173514,173648,174672,175898,176185,177001,178339,179205,180121,180912,174,1011,134,1024,1226,287,816,1338,866,916,791,446,1809,1755,1670,1819,1804,1797,1708,1742,1664,1664,382,1284,1410,1412,1324,1492,1421,1553,1609,1548,1613,64,525,345,258,495,312,376,155,133,116,51,36,100,95,103,86,64,112,141,68,134,120,94,393,-293,693,684,-77,339,1057,676,672,615,130,493,-198,796,770,-13,451,1198,744,806,735,-20,-7,-13,-30,-39,-12,-11,-15,-11,-6,5,1198,1198,1198,1198,1198,1198,1199,1198,1199,1199,1199,1199,10.456133658,10.110553574,9.588883785,10.377385401,10.247583666,10.175941289,9.6133280801,9.7442552525,9.2617845633,9.217993923,7.4216006728,8.1230088547,8.1074873679,7.5534130131,8.4752742961,8.04675157,8.7409241853,9.0002908733,8.6161313125,8.9354712727,3.0345329854,1.9875447198,1.4813964171,2.8239723878,1.7723093702,2.1291897187,0.8724038949,0.7439643792,0.6456532508,0.2825226503,0.5780062829,0.5472949228,0.5914101975,0.4906295462,0.36355064,0.6342267247,0.7936061237,0.3803727653,0.7458408242,0.6647591771,2.2715646919,-1.687972762,3.9790996785,3.9022163904,-0.437396864,1.91966839,5.9492317217,3.7813527846,3.7403360736,3.4068907828,2.8495709748,-1.140677839,4.570509876,4.3928459366,-0.073846224,2.5538951148,6.7428378454,4.1617255499,4.4861768979,4.07164996 +050,2,3,39,105,Ohio,Meigs County,23770,23767,23732,23650,23575,23448,23285,23192,23189,23083,23050,22868,22678,-35,-82,-75,-127,-163,-93,-3,-106,-33,-182,-190,63,260,252,264,254,214,247,241,260,206,201,72,257,259,286,265,294,286,310,328,296,290,-9,3,-7,-22,-11,-80,-39,-69,-68,-90,-89,0,-1,-1,2,-1,0,-2,-2,-2,-2,-1,-24,-84,-66,-106,-149,-10,39,-34,39,-91,-100,-24,-85,-67,-104,-150,-10,37,-36,37,-93,-101,-2,0,-1,-1,-2,-3,-1,-1,-2,1,0,212,212,212,212,212,212,212,212,212,212,212,212,10.974631717,10.672313393,11.228547732,10.870262983,9.2088559933,10.650913089,10.416666667,11.271757744,8.9725162246,8.8262416019,10.848001351,10.968766543,12.164260043,11.341022404,12.651418981,12.332636209,13.399031812,14.219755923,12.892547585,12.734378431,0.126630366,-0.29645315,-0.935712311,-0.470759421,-3.442562988,-1.681723119,-2.982365145,-2.947998179,-3.92003136,-3.908136829,-0.042210122,-0.04235045,0.0850647555,-0.042796311,0,-0.086242211,-0.086445367,-0.086705829,-0.087111808,-0.04391165,-3.545650247,-2.795129698,-4.508432044,-6.376650333,-0.430320374,1.6817231194,-1.469571231,1.6907636616,-3.963587264,-4.391164976,-3.587860369,-2.837480148,-4.423367288,-6.419446644,-0.430320374,1.5954809081,-1.556016598,1.6040578328,-4.050699072,-4.435076626 +050,2,3,39,107,Ohio,Mercer County,40814,40818,40791,40720,40710,40623,40739,40735,40768,40889,40986,41255,41274,-27,-71,-10,-87,116,-4,33,121,97,269,19,146,517,519,564,563,575,627,575,661,633,637,119,383,425,414,403,404,437,432,390,388,408,27,134,94,150,160,171,190,143,271,245,229,1,3,12,15,15,17,22,29,16,30,24,-55,-208,-115,-255,-53,-192,-177,-49,-190,-6,-234,-54,-205,-103,-240,-38,-175,-155,-20,-174,24,-210,0,0,-1,3,-6,0,-2,-2,0,0,0,439,439,439,439,439,439,439,439,439,439,439,439,12.685404424,12.747144787,13.868909299,13.839384479,14.114932371,15.385936714,14.083299656,16.146564885,15.39378169,15.436997904,9.3975046313,10.438413361,10.180369592,9.9063444851,9.9172742225,10.723531649,10.580844263,9.5267175573,9.4356829319,9.8874335082,3.2878997927,2.3087314258,3.6885397071,3.9330399941,4.1976581486,4.6624050648,3.5024553927,6.6198473282,5.9580987585,5.5495643955,0.0736096969,0.2947316714,0.3688539707,0.3687224994,0.417311044,0.5398574286,0.7102881566,0.3908396947,0.7295631133,0.5816137358,-5.103605648,-2.824511851,-6.270517502,-1.302819498,-4.713160027,-4.343398403,-1.200142058,-4.641221374,-0.145912623,-5.670733924,-5.029995951,-2.529780179,-5.901663531,-0.934096999,-4.295848982,-3.803540974,-0.489853901,-4.250381679,0.5836504906,-5.089120188 +050,2,3,39,109,Ohio,Miami County,102506,102503,102487,102742,102947,103228,103876,104100,104553,105215,106091,106995,107516,-16,255,205,281,648,224,453,662,876,904,521,292,1140,1171,1097,1212,1218,1193,1192,1218,1170,1192,211,1004,1010,1012,1036,1044,1102,1144,1117,1169,1153,81,136,161,85,176,174,91,48,101,1,39,17,58,71,66,94,96,85,71,43,60,47,-111,64,-7,147,400,-31,284,550,738,847,434,-94,122,64,213,494,65,369,621,781,907,481,-3,-3,-20,-17,-22,-15,-7,-7,-6,-4,1,1055,1055,1055,1055,1055,1055,1055,1055,1056,1056,1056,1056,11.109541049,11.386121766,10.641445374,11.704264524,11.712889949,11.435253747,11.364936501,11.528304923,10.981481655,11.113649183,9.7841922925,9.8206515662,9.8169031163,10.004635352,10.039619956,10.562992145,10.907288052,10.572345319,10.972095774,10.750031467,1.3253487568,1.5654702002,0.8245422578,1.6996291718,1.6732699927,0.8722616018,0.4576484497,0.9559596036,0.0093858818,0.3636177166,0.5652222639,0.6903626349,0.6402328119,0.9077564895,0.9231834442,0.8147498478,0.6769383319,0.4069927025,0.5631529054,0.4382059661,0.6236935326,-0.068063922,1.4259730811,3.8627935723,-0.298111321,2.722223021,5.2438884863,6.9851305689,7.9498418479,4.0464125383,1.1889157965,0.6222987131,2.0662058931,4.7705500618,0.6250721237,3.5369728688,5.9208268182,7.3921232715,8.5129947533,4.4846185044 +050,2,3,39,111,Ohio,Monroe County,14642,14631,14609,14618,14509,14514,14368,14267,14095,13946,13798,13708,13586,-22,9,-109,5,-146,-101,-172,-149,-148,-90,-122,37,180,140,151,154,165,133,116,117,136,127,23,186,159,178,171,186,177,170,184,179,195,14,-6,-19,-27,-17,-21,-44,-54,-67,-43,-68,0,2,1,1,1,-1,0,0,0,0,0,-37,15,-91,33,-132,-79,-127,-95,-81,-45,-54,-37,17,-90,34,-131,-80,-127,-95,-81,-45,-54,1,-2,0,-2,2,0,-1,0,0,-2,0,165,165,165,165,165,165,165,165,165,165,165,165,12.317377767,9.6130737803,10.405540433,10.664081435,11.524358303,9.3787462097,8.2735993723,8.4342560554,9.8887515451,9.3060745951,12.727957026,10.917705222,12.266133756,11.84128523,12.991094814,12.481489317,12.125102528,13.264129181,13.015342107,14.288854693,-0.410579259,-1.304631442,-1.860593323,-1.177203795,-1.466736511,-3.102743107,-3.851503156,-4.829873126,-3.126590562,-4.982780098,0.136859753,0.0686648127,0.0689108638,0.069247282,-0.069844596,0,0,0,0,0,1.0264481473,-6.248497957,2.2740585053,-9.14064123,-5.517723066,-8.955644877,-6.775792589,-5.839100346,-3.272013379,-3.956913607,1.1633079002,-6.179833145,2.3429693691,-9.071393948,-5.587567662,-8.955644877,-6.775792589,-5.839100346,-3.272013379,-3.956913607 +050,2,3,39,113,Ohio,Montgomery County,535153,535199,535620,534638,534464,534448,532708,532059,532274,531964,531954,532139,531610,421,-982,-174,-16,-1740,-649,215,-310,-10,185,-529,1718,6559,6777,6710,6627,6647,6700,6650,6626,6431,6367,1288,5687,5623,5871,5870,6054,6175,6431,6397,6289,6441,430,872,1154,839,757,593,525,219,229,142,-74,245,847,1034,1366,1102,1254,1352,1105,636,1003,791,-179,-2695,-2325,-2193,-3592,-2461,-1635,-1609,-850,-965,-1270,66,-1848,-1291,-827,-2490,-1207,-283,-504,-214,38,-479,-75,-6,-37,-28,-7,-35,-27,-25,-25,5,24,14142,14507,14602,14791,15081,14825,14965,15250,15036,15380,15509,15268,12.256857692,12.677929702,12.554822099,12.419927358,12.485360647,12.590044657,12.497204573,12.455847161,12.087289363,11.970869068,10.627344061,10.51910856,10.985001572,11.001203198,11.371501934,11.603511307,12.085642497,12.025362857,11.820395398,12.109999633,1.6295136313,2.1588211415,1.5698205278,1.4187241603,1.1138587128,0.98653335,0.4115620754,0.4304843042,0.2668939651,-0.139130566,1.582795924,1.9343336744,2.5558698939,2.0653025425,2.3554449002,2.5405582651,2.0766031658,1.1955808624,1.8851735704,1.4871929374,-5.036168849,-4.349444674,-4.103237685,-6.731911735,-4.622607575,-3.072346719,-3.023759723,-1.597867505,-1.813751242,-2.387781328,-3.453372925,-2.415111,-1.547367791,-4.666609193,-2.267162675,-0.531788453,-0.947156557,-0.402286642,0.0714223287,-0.900588391 +050,2,3,39,115,Ohio,Morgan County,15054,15043,15033,15036,14929,14893,14731,14736,14746,14645,14585,14505,14305,-10,3,-107,-36,-162,5,10,-101,-60,-80,-200,49,148,137,139,135,147,162,130,160,132,125,54,162,177,183,161,155,180,190,180,173,177,-5,-14,-40,-44,-26,-8,-18,-60,-20,-41,-52,0,1,0,1,2,2,2,2,1,2,1,-4,16,-65,9,-140,12,26,-42,-42,-41,-148,-4,17,-65,10,-138,14,28,-40,-41,-39,-147,-1,0,-2,-2,2,-1,0,-1,1,0,-1,188,188,188,188,188,188,188,188,188,188,188,188,9.8440254082,9.1440013349,9.3219770639,9.114231704,9.9772627006,10.989756462,8.8462454493,10.947656517,9.0752836026,8.67754252,10.775217001,11.813782747,12.272818724,10.869565217,10.520242984,12.210840513,12.929127964,12.316113582,11.894121691,12.287400208,-0.931191593,-2.669781412,-2.950841661,-1.755333513,-0.542980283,-1.221084051,-4.082882515,-1.368457065,-2.818838089,-3.609857688,0.0665136852,0,0.0670645832,0.1350256549,0.1357450708,0.1356760057,0.1360960838,0.0684228532,0.137504297,0.0694203402,1.0642189631,-4.338394794,0.6035812487,-9.451795841,0.8144704245,1.7637880741,-2.858017761,-2.873759836,-2.818838089,-10.27421034,1.1307326482,-4.338394794,0.6706458319,-9.316770186,0.9502154953,1.8994640798,-2.721921677,-2.805336983,-2.681333792,-10.20479 +050,2,3,39,117,Ohio,Morrow County,34827,34825,34790,34813,34839,34851,34941,34954,34928,34928,35133,35342,35411,-35,23,26,12,90,13,-26,0,205,209,69,93,368,413,394,381,368,370,377,388,364,381,95,308,302,316,303,326,336,339,320,316,358,-2,60,111,78,78,42,34,38,68,48,23,1,6,6,5,2,-2,-4,-3,-3,-3,-2,-33,-43,-91,-69,18,-25,-56,-33,141,162,47,-32,-37,-85,-64,20,-27,-60,-36,138,159,45,-1,0,0,-2,-8,-2,0,-2,-1,2,1,366,366,366,366,366,366,366,366,366,366,366,366,10.574256857,11.858955952,11.307217678,10.918156809,10.530080836,10.58927907,10.793632616,11.076062289,10.329904221,10.769861349,8.8501932388,8.6716820766,9.0687329603,8.6829436039,9.3282781315,9.6162101829,9.7056802565,9.1348967328,8.9677190493,10.119712238,1.7240636179,3.1872738758,2.238484718,2.235213205,1.2018027041,0.9730688876,1.0879523591,1.9411655557,1.362185172,0.6501491103,0.1724063618,0.1722850744,0.1434926101,0.0573131591,-0.0572287,-0.114478693,-0.085890976,-0.085639657,-0.085136573,-0.056534705,-1.235578926,-2.612990295,-1.98019802,0.5158184319,-0.715358752,-1.602701697,-0.944800733,4.0250638729,4.5973749557,1.3285655732,-1.063172564,-2.44070522,-1.83670541,0.573131591,-0.772587453,-1.71718039,-1.030691709,3.939424216,4.5122383824,1.2720308679 +050,2,3,39,119,Ohio,Muskingum County,86074,86086,86213,86252,85803,85660,85918,86213,85958,86099,86048,86042,86020,127,39,-449,-143,258,295,-255,141,-51,-6,-22,280,1064,1015,1025,1025,1060,1000,1014,1040,993,970,192,907,943,1006,944,1020,1000,1007,1052,1000,1019,88,157,72,19,81,40,0,7,-12,-7,-49,7,36,42,79,71,94,55,39,26,35,25,44,-151,-568,-236,120,173,-307,102,-63,-34,-2,51,-115,-526,-157,191,267,-252,141,-37,1,23,-12,-3,5,-5,-14,-12,-3,-7,-2,0,4,1898,1886,1885,1760,1761,1742,1742,1760,1675,1621,1595,1571,12.338735396,11.798552788,11.955932184,11.947918731,12.316201033,11.616358156,11.786791587,12.082696765,11.540473008,11.275005521,10.518076131,10.961611113,11.734310026,11.003741738,11.85143873,11.616358156,11.705423203,12.222112497,11.621825789,11.844567656,1.8206592642,0.8369416756,0.2216221576,0.9441769924,0.4647623031,0,0.0813683837,-0.139415732,-0.081352781,-0.569562135,0.4174760096,0.4882159774,0.9214816024,0.8276119316,1.0921914124,0.6388996986,0.4533381379,0.3020674191,0.4067639026,0.2905929258,-1.751079929,-6.602539886,-2.752780483,1.3987807295,2.010096961,-3.566221954,1.1856535915,-0.731932592,-0.395142077,-0.023247434,-1.33360392,-6.114323908,-1.831298881,2.2263926611,3.1022883734,-2.927322255,1.6389917295,-0.429865173,0.0116218258,0.2673454917 +050,2,3,39,121,Ohio,Noble County,14645,14655,14660,14754,14676,14678,14532,14468,14459,14406,14368,14451,14364,5,94,-78,2,-146,-64,-9,-53,-38,83,-87,38,145,157,140,134,145,146,121,147,140,145,18,105,133,133,132,134,139,141,140,139,161,20,40,24,7,2,11,7,-20,7,1,-16,0,2,6,2,0,-1,1,2,1,2,2,-14,52,-108,-4,-150,-72,-15,-34,-47,81,-72,-14,54,-102,-2,-150,-73,-14,-32,-46,83,-70,-1,0,0,-3,2,-2,-2,-1,1,-1,-1,2672,2653,2669,2647,2759,2712,2682,2677,2655,2673,2682,2655,9.8592506969,10.669384981,9.5387340737,9.174940089,10,10.094375497,8.3838558808,10.217557517,9.7158124848,10.064202672,7.1394574012,9.0383961944,9.06179737,9.0380006847,9.2413793103,9.6103985896,9.7696171834,9.7310071592,9.6464138242,11.174735381,2.7197932957,1.630988787,0.4769367037,0.1369394043,0.7586206897,0.4839769074,-1.385761303,0.486550358,0.0693986606,-1.110532709,0.1359896648,0.4077471967,0.1362676296,0,-0.068965517,0.0691395582,0.1385761303,0.069507194,0.1387973212,0.1388165886,3.5357312844,-7.339449541,-0.272535259,-10.27045532,-4.965517241,-1.037093373,-2.355794214,-3.266838118,5.6212915091,-4.997397189,3.6717209492,-6.931702345,-0.13626763,-10.27045532,-5.034482759,-0.967953815,-2.217218084,-3.197330924,5.7600888303,-4.8585806 +050,2,3,39,123,Ohio,Ottawa County,41428,41433,41359,41323,41246,41041,40906,40761,40531,40652,40819,40532,40253,-74,-36,-77,-205,-135,-145,-230,121,167,-287,-279,75,361,364,325,316,361,367,307,346,312,318,142,447,446,517,461,458,473,528,517,519,545,-67,-86,-82,-192,-145,-97,-106,-221,-171,-207,-227,3,5,7,2,-1,-1,4,8,8,4,2,-5,47,4,-12,20,-42,-126,337,332,-85,-52,-2,52,11,-10,19,-43,-122,345,340,-81,-50,-5,-2,-6,-3,-9,-5,-2,-3,-2,1,-2,495,495,495,495,495,495,495,495,495,495,495,495,8.732251276,8.8168683162,7.8991821308,7.7123018536,8.8407802417,9.029178763,7.5631597748,8.4938198868,7.6704650219,7.8727486538,10.812510583,10.803085904,12.565775882,11.25117454,11.21628075,11.637061457,13.007649385,12.691632605,12.759523546,13.492603825,-2.080259307,-1.986217588,-4.666593751,-3.538872686,-2.375500508,-2.607882694,-5.44448961,-4.197812719,-5.089058524,-5.619855171,0.1209453085,0.1695551599,0.0486103516,-0.024406019,-0.024489696,0.0984106677,0.1970855967,0.1963888991,0.0983392952,0.0495141425,1.1368859002,0.0968886628,-0.291662109,0.4881203705,-1.02856723,-3.099936033,8.3022307626,8.1501393134,-2.089710022,-1.287367704,1.2578312087,0.2664438227,-0.243051758,0.463714352,-1.053056926,-3.001525365,8.4993163593,8.3465282125,-1.991370727,-1.237853562 +050,2,3,39,125,Ohio,Paulding County,19614,19610,19558,19369,19245,19138,18970,18953,18827,18816,18747,18672,18648,-52,-189,-124,-107,-168,-17,-126,-11,-69,-75,-24,60,234,218,200,243,212,211,216,226,213,219,68,190,199,204,157,193,213,203,195,224,224,-8,44,19,-4,86,19,-2,13,31,-11,-5,2,4,5,8,5,11,4,4,0,5,4,-46,-238,-150,-113,-264,-45,-129,-27,-100,-68,-22,-44,-234,-145,-105,-259,-34,-125,-23,-100,-63,-18,0,1,2,2,5,-2,1,-1,0,-1,-1,85,85,85,85,85,85,85,85,85,85,85,85,12.022503661,11.291241519,10.421280254,12.753227669,11.180550062,11.169931181,11.476237282,12.033117696,11.384590716,11.736334405,9.7618619467,10.307142487,10.629705859,8.2397396872,10.178519632,11.275807305,10.785537816,10.382557304,11.972527326,12.004287245,2.260641714,0.9840990314,-0.208425605,4.5134879815,1.0020304301,-0.105876125,0.690699466,1.6505603919,-0.58793661,-0.26795284,0.2055128831,0.2589734293,0.4168512102,0.2624120919,0.5801228806,0.2117522499,0.2125229126,0,0.2672439135,0.2143622722,-12.22801654,-7.76920288,-5.888023344,-13.85535845,-2.373229966,-6.829010058,-1.43452966,-5.324388361,-3.634517224,-1.178992497,-12.02250366,-7.51022945,-5.471172133,-13.59294636,-1.793107085,-6.617257808,-1.222006748,-5.324388361,-3.36727331,-0.964630225 +050,2,3,39,127,Ohio,Perry County,36058,36036,36037,36229,35983,36000,35926,35970,36015,35975,36046,36127,36215,1,192,-246,17,-74,44,45,-40,71,81,88,109,453,403,426,429,438,444,404,444,385,413,102,319,357,308,370,370,335,361,379,356,413,7,134,46,118,59,68,109,43,65,29,0,1,2,2,7,14,6,13,14,9,11,9,-5,58,-298,-107,-146,-27,-76,-96,-2,42,78,-4,60,-296,-100,-132,-21,-63,-82,7,53,87,-2,-2,4,-1,-1,-3,-1,-1,-1,-1,1,307,307,307,307,307,307,307,307,307,307,307,307,12.537016024,11.161579793,11.836127975,11.928926953,12.184266162,12.335903313,11.223781081,12.32973716,10.668809666,11.417986785,8.8284947278,9.8875533152,8.5575760944,10.288351917,10.292644932,9.3074946169,10.029170718,10.524708071,9.8651850415,11.417986785,3.7085212963,1.2740264776,3.2785518803,1.6405750355,1.8916212307,3.0284086963,1.1946103626,1.8050290887,0.8036246242,0,0.0553510641,0.0553924555,0.1944903658,0.3892889915,0.1669077556,0.3611863583,0.3889429087,0.2499271046,0.3048231333,0.248818114,1.6051808596,-8.253475877,-2.972924163,-4.059728054,-0.7510849,-2.111551018,-2.667037088,-0.055539357,1.1638701453,2.1564236543,1.6605319237,-8.198083421,-2.778433797,-3.670439062,-0.584177145,-1.750364659,-2.27809418,0.194387748,1.4686932786,2.4052417683 +050,2,3,39,129,Ohio,Pickaway County,55698,55680,55737,55946,56235,56352,56703,56991,57513,57769,58099,58521,58658,57,209,289,117,351,288,522,256,330,422,137,172,573,586,618,594,662,566,635,583,619,602,98,481,504,550,470,528,598,640,649,591,643,74,92,82,68,124,134,-32,-5,-66,28,-41,2,5,14,9,12,13,27,20,12,15,14,-20,112,200,49,221,145,526,246,385,381,163,-18,117,214,58,233,158,553,266,397,396,177,1,0,-7,-9,-6,-4,1,-5,-1,-2,1,4455,4352,4379,4710,4861,4826,4568,4880,4860,4722,4760,4460,10.261185677,10.447401966,10.978176877,10.508159745,11.645293507,9.8861175155,11.016463975,10.063175337,10.615674841,10.274878605,8.6136654639,8.9854788244,9.7702221393,8.3145371722,9.2880890812,10.445049955,11.103207786,11.202402734,10.135482765,10.974662696,1.6475202135,1.4619231421,1.2079547372,2.1936225731,2.3572044259,-0.558932439,-0.086743811,-1.139227397,0.4801920768,-0.699784091,0.089539142,0.249596634,0.1598763623,0.2122860555,0.2286840115,0.4715992454,0.3469752433,0.2071322539,0.2572457554,0.2389506652,2.0056767816,3.5656662002,0.8704379724,3.9096015214,2.5507062818,9.1874519667,4.2677954928,6.6454931474,6.5340421883,2.7820684594,2.0952159236,3.8152628342,1.0303143347,4.1218875768,2.7793902932,9.6590512122,4.6147707361,6.8526254013,6.7912879437,3.0210191246 +050,2,3,39,131,Ohio,Pike County,28709,28568,28606,28471,28365,28266,28176,28115,28101,28084,27908,27784,27695,38,-135,-106,-99,-90,-61,-14,-17,-176,-124,-89,87,351,324,363,353,347,351,338,350,342,345,48,340,332,346,312,322,357,366,413,368,396,39,11,-8,17,41,25,-6,-28,-63,-26,-51,1,1,6,8,1,-1,-1,-1,-1,-1,-1,2,-148,-102,-122,-132,-83,-5,14,-113,-97,-38,3,-147,-96,-114,-131,-84,-6,13,-114,-98,-39,-4,1,-2,-2,0,-2,-2,-2,1,0,1,496,496,496,496,496,496,496,496,496,496,496,496,12.299174799,11.401224576,12.81983366,12.508415719,12.328791459,12.487548029,12.031681054,12.501785969,12.281835811,12.437138377,11.913730574,11.682736294,12.219455775,11.055596896,11.440549999,12.701010389,13.02838836,14.752107444,13.215542627,14.275671876,0.3854442245,-0.281511718,0.6003778849,1.4528188229,0.8882414596,-0.213462359,-0.996707306,-2.250321474,-0.933706816,-1.838533499,0.035040384,0.2111337884,0.2825307694,0.0354346054,-0.035529658,-0.03557706,-0.03559669,-0.035719388,-0.035911801,-0.036049676,-5.185976838,-3.589274404,-4.308594233,-4.677367918,-2.948961646,-0.1778853,0.4983536531,-4.036290899,-3.48344466,-1.369887705,-5.150936454,-3.378140615,-4.026063463,-4.641933312,-2.984491304,-0.213462359,0.4627569636,-4.072010287,-3.519356461,-1.405937382 +050,2,3,39,133,Ohio,Portage County,161419,161430,161397,161894,161418,161746,162520,162667,162564,162441,162367,162426,162583,-33,497,-476,328,774,147,-103,-123,-74,59,157,410,1499,1382,1422,1505,1476,1431,1388,1383,1343,1348,337,1294,1363,1377,1374,1464,1477,1520,1546,1489,1571,73,205,19,45,131,12,-46,-132,-163,-146,-223,56,312,359,615,575,663,565,437,271,394,313,-156,-17,-856,-320,101,-521,-620,-426,-181,-192,61,-100,295,-497,295,676,142,-55,11,90,202,374,-6,-3,2,-12,-33,-7,-2,-2,-1,3,6,7914,7914,8075,8029,7900,7867,7877,7884,7812,7463,7441,7139,9.2733790919,8.5490176671,8.8004852026,9.2825026367,9.0778536657,8.7998991486,8.5414070553,8.5158001034,8.2698826637,8.2951549034,8.0051718112,8.4314841392,8.5219888354,8.4745240019,9.0040499774,9.0827750122,9.3537022507,9.5194699638,9.1689168178,9.6674245944,1.2682072807,0.117533528,0.2784963672,0.8079786348,0.0738036883,-0.282875864,-0.812295195,-1.00366986,-0.899034154,-1.372269691,1.9301496175,2.2207650814,3.806117018,3.5464711071,4.0776537807,3.4744535423,2.6891893971,1.6686781114,2.4261606623,1.926100508,-0.105168409,-5.295194734,-1.980418611,0.6229453597,-3.204310135,-3.812674684,-2.621498131,-1.114504569,-1.18229149,0.3753742204,1.8249812089,-3.074429653,1.825698407,4.1694164667,0.8733436453,-0.338221141,0.0676912663,0.5541735425,1.2438691721,2.3014747284 +050,2,3,39,135,Ohio,Preble County,42270,42254,42172,41989,41821,41685,41509,41313,41148,41119,41023,40848,40836,-82,-183,-168,-136,-176,-196,-165,-29,-96,-175,-12,89,455,451,441,440,445,409,449,425,455,426,117,456,477,432,473,449,479,523,466,506,500,-28,-1,-26,9,-33,-4,-70,-74,-41,-51,-74,6,9,26,24,21,34,31,24,19,20,15,-58,-191,-166,-169,-164,-225,-125,24,-74,-143,45,-52,-182,-140,-145,-143,-191,-94,48,-55,-123,60,-2,0,-2,0,0,-1,-1,-3,0,-1,2,386,386,386,386,386,386,386,386,386,386,386,386,10.812609166,10.76243885,10.562115297,10.577685891,10.74593707,9.9198408945,10.915677003,10.347934065,11.115046842,10.430439254,10.836373142,11.38288987,10.346561924,11.371012333,10.842529763,11.617613175,12.714697266,11.346205352,12.360909235,12.242299594,-0.023763976,-0.62045102,0.2155533734,-0.793326442,-0.096592693,-1.69777228,-1.799020263,-0.998271286,-1.245862393,-1.81186034,0.2138757857,0.6204510202,0.5748089958,0.5048440993,0.8210378885,0.7518705812,0.5834660313,0.4626135229,0.4885734876,0.3672689878,-4.538919452,-3.961341129,-4.047613345,-3.942592014,-5.433338968,-3.031736215,0.5834660313,-1.801757931,-3.493300436,1.1018069634,-4.325043666,-3.340890109,-3.472804349,-3.437747915,-4.612301079,-2.279865633,1.1669320627,-1.339144408,-3.004726948,1.4690759512 +050,2,3,39,137,Ohio,Putnam County,34499,34496,34476,34386,34207,34122,34194,34020,34004,33870,33809,33843,33654,-20,-90,-179,-85,72,-174,-16,-134,-61,34,-189,119,474,432,438,470,455,424,435,430,422,424,59,308,281,327,291,299,294,318,331,312,350,60,166,151,111,179,156,130,117,99,110,74,4,16,16,14,7,8,15,21,17,21,15,-89,-272,-353,-214,-116,-341,-160,-275,-177,-97,-278,-85,-256,-337,-200,-109,-333,-145,-254,-160,-76,-263,5,0,7,4,2,3,-1,3,0,0,0,303,303,303,303,303,303,303,303,303,303,303,303,13.766663762,12.596037497,12.820325191,13.759587798,13.340370012,12.466188404,12.817868403,12.707043544,12.475610477,12.563521342,8.9454270861,8.1932558716,9.5713386703,8.5192341472,8.766528865,8.6440079972,9.3703037982,9.7814684023,9.2236740968,10.370831296,4.8212366763,4.4027816249,3.2489865211,5.2403536507,4.573841147,3.8221804069,3.447564605,2.9255751415,3.2519363803,2.1926900455,0.464697511,0.4665199073,0.4097820837,0.204930031,0.2345559563,0.4410208162,0.6187936471,0.5023714889,0.6208242181,0.4444641984,-7.899857686,-10.29259545,-6.263811851,-3.395983371,-9.997947635,-4.704222039,-8.10325014,-5.230573738,-2.867616626,-8.237403144,-7.435160175,-9.826075547,-5.854029768,-3.19105334,-9.763391679,-4.263201223,-7.484456493,-4.728202249,-2.246792408,-7.792938945 +050,2,3,39,139,Ohio,Richland County,124475,124472,124156,123151,122645,122339,122030,121720,121324,120500,121117,121384,120891,-316,-1005,-506,-306,-309,-310,-396,-824,617,267,-493,309,1415,1412,1410,1420,1401,1426,1285,1361,1390,1385,330,1351,1322,1393,1316,1462,1370,1530,1480,1476,1494,-21,64,90,17,104,-61,56,-245,-119,-86,-109,3,26,26,42,46,45,56,39,24,30,28,-305,-1097,-627,-357,-449,-282,-502,-619,714,324,-412,-302,-1071,-601,-315,-403,-237,-446,-580,738,354,-384,7,2,5,-8,-10,-12,-6,1,-2,-1,0,7263,7263,7184,7147,7204,7276,7405,7387,6930,7325,7376,6872,11.443266871,11.489202428,11.510955818,11.621768719,11.495384615,11.734500749,10.627563848,11.265763585,11.463870252,11.433288618,10.925691549,10.756887826,11.372171244,10.770596925,11.995897436,11.27367884,12.653830885,12.250793611,12.173145678,12.33309256,0.5175753214,0.7323146024,0.1387845737,0.8511717935,-0.500512821,0.4608219088,-2.026267037,-0.985030027,-0.709275426,-0.899803942,0.2102649743,0.2115575518,0.342879535,0.3764798317,0.3692307692,0.4608219088,0.3225486304,0.198661518,0.2474216601,0.231142297,-8.871564493,-5.10179173,-2.914476047,-3.674770531,-2.313846154,-4.130939254,-5.119425698,5.9101801612,2.6721539293,-3.401093798,-8.661299518,-4.890234178,-2.571596512,-3.2982907,-1.944615385,-3.670117345,-4.796877068,6.1088416792,2.9195755894,-3.169951501 +050,2,3,39,141,Ohio,Ross County,78064,78079,78102,77594,77359,77299,77116,77067,76888,77299,76859,76613,76420,23,-508,-235,-60,-183,-49,-179,411,-440,-246,-193,183,778,909,806,904,809,869,855,830,828,808,170,838,814,821,750,860,897,824,867,889,929,13,-60,95,-15,154,-51,-28,31,-37,-61,-121,7,29,24,28,20,22,11,5,2,3,3,13,-480,-353,-64,-350,-12,-159,374,-406,-189,-77,20,-451,-329,-36,-330,10,-148,379,-404,-186,-74,-10,3,-1,-9,-7,-8,-3,1,1,1,2,6361,6361,6038,5812,5736,5819,5712,5714,6214,5689,5356,5243,9.9938341383,11.732589882,10.42299784,11.708707056,10.494023336,11.289013023,11.090429154,10.768172914,10.790241868,10.559813896,10.764566848,10.506411622,10.616974227,9.7140821811,11.155574869,11.652755675,10.688320027,11.248199899,11.585175146,12.141172165,-0.77073271,1.2261782605,-0.193976387,1.9946248745,-0.661551533,-0.363742652,0.4021091272,-0.480026985,-0.794933278,-1.581358269,0.3725208098,0.30977135,0.362089255,0.2590421915,0.2853751711,0.142898899,0.0648563108,0.0259474046,0.0390950792,0.0392072298,-6.165861679,-4.556220273,-0.827632583,-4.533238351,-0.155659184,-2.065538631,4.8512520511,-5.267323136,-2.462989992,-1.006318899,-5.793340869,-4.246448923,-0.465543328,-4.27419616,0.1297159868,-1.922639732,4.9161083619,-5.241375731,-2.423894912,-0.967111669 +050,2,3,39,143,Ohio,Sandusky County,60944,60946,60886,60609,60467,60052,59830,59476,59311,59097,58726,58520,58351,-60,-277,-142,-415,-222,-354,-165,-214,-371,-206,-169,162,703,711,675,623,677,689,639,633,634,625,135,627,609,652,634,665,647,718,694,670,668,27,76,102,23,-11,12,42,-79,-61,-36,-43,6,17,13,4,0,15,12,21,2,19,17,-94,-369,-259,-446,-208,-380,-217,-154,-312,-188,-145,-88,-352,-246,-442,-208,-365,-205,-133,-310,-169,-128,1,-1,2,4,-3,-1,-2,-2,0,-1,2,901,901,901,901,901,901,901,901,902,902,902,902,11.572492695,11.744689286,11.201553282,10.393553661,11.348968199,11.600596025,10.793189649,10.744930956,10.814867885,10.695553217,10.321412404,10.059797152,10.819870726,10.57706745,11.147804804,10.893447936,12.127558949,11.780382438,11.428961329,11.431407278,1.2510802914,1.6848921339,0.3816825563,-0.183513789,0.201163395,0.7071480886,-1.334369299,-1.035451482,-0.614093445,-0.735854061,0.2798469073,0.2147411543,0.066379575,0,0.2514542437,0.202042311,0.3547057631,0.0339492289,0.3241048735,0.2909190475,-6.074324046,-4.278304536,-7.401322613,-3.470078911,-6.370174174,-3.653598458,-2.601175596,-5.296079713,-3.206932433,-2.481368346,-5.794477139,-4.063563382,-7.334943038,-3.470078911,-6.11871993,-3.451556147,-2.246469833,-5.262130484,-2.882827559,-2.190449299 +050,2,3,39,145,Ohio,Scioto County,79499,79659,79672,79425,78808,78333,77509,77024,76451,76018,75338,75051,74347,13,-247,-617,-475,-824,-485,-573,-433,-680,-287,-704,216,873,902,915,925,873,864,887,848,810,784,221,906,937,953,997,1006,955,1055,1078,1031,1037,-5,-33,-35,-38,-72,-133,-91,-168,-230,-221,-253,9,29,32,53,34,32,21,15,10,12,10,20,-240,-619,-494,-800,-380,-503,-278,-461,-79,-462,29,-211,-587,-441,-766,-348,-482,-263,-451,-67,-452,-11,-3,5,4,14,-4,0,-2,1,1,1,3642,3638,3673,3627,3462,3274,3402,3291,3371,3164,3325,3148,10.974436979,11.400908786,11.645592175,11.870997549,11.29855759,11.25916273,11.635152064,11.205370121,10.772064446,10.495455093,11.389278239,11.843294382,12.129234255,12.795010331,13.019872778,12.445023619,13.838878723,14.244562488,13.71110919,13.88238129,-0.41484126,-0.442385596,-0.483642079,-0.924012782,-1.721315188,-1.185860889,-2.203726659,-3.039192368,-2.939044744,-3.386926197,0.3645574712,0.4044668306,0.6745534265,0.4363393694,0.4141510228,0.2736602052,0.1967613089,0.1321387986,0.1595861399,0.1338706007,-3.017027348,-7.823905254,-6.287347032,-10.26680869,-4.918043395,-6.554813488,-3.646642924,-6.091598615,-1.050608755,-6.184821751,-2.652469877,-7.419438423,-5.612793606,-9.830469321,-4.503892373,-6.281153282,-3.449881615,-5.959459817,-0.891022615,-6.050951151 +050,2,3,39,147,Ohio,Seneca County,56745,56743,56619,56526,56117,55860,55819,55672,55517,55322,55256,55220,54938,-124,-93,-409,-257,-41,-147,-155,-195,-66,-36,-282,140,601,582,582,557,599,611,568,611,573,584,156,565,623,605,573,566,571,647,624,601,611,-16,36,-41,-23,-16,33,40,-79,-13,-28,-27,10,42,49,53,53,84,86,68,47,52,42,-122,-171,-418,-289,-70,-264,-281,-182,-99,-61,-296,-112,-129,-369,-236,-17,-180,-195,-114,-52,-9,-254,4,0,1,2,-8,0,0,-2,-1,1,-1,2534,2534,2615,2644,2638,2670,2603,2542,2546,2598,2677,2468,10.62353617,10.3335316,10.394991829,9.9750176846,10.745261949,10.990295803,10.249100046,11.051022807,10.373293747,10.602952123,9.9871845862,11.061495166,10.805790475,10.261553202,10.153285915,10.270800169,11.674591074,11.286150952,10.880191173,11.093157102,0.6363515843,-0.727963566,-0.410798646,-0.286535517,0.5919760339,0.7194956336,-1.425491028,-0.235128145,-0.506897426,-0.490204978,0.7424101816,0.8700052378,0.9466229672,0.9491489,1.5068480864,1.5469156122,1.2270049351,0.8500786775,0.9413809334,0.7625410774,-3.022670025,-7.421677335,-5.161774293,-1.253592887,-4.735808272,-5.054456826,-3.28404262,-1.790591257,-1.104312249,-5.374099021,-2.280259844,-6.551672097,-4.215151326,-0.304443987,-3.228960185,-3.507541214,-2.057037685,-0.940512579,-0.162931315,-4.611557944 +050,2,3,39,149,Ohio,Shelby County,49423,49455,49347,49256,49158,49202,49001,49036,48760,48731,48632,48592,48337,-108,-91,-98,44,-201,35,-276,-29,-99,-40,-255,135,625,629,642,564,645,600,623,613,614,610,113,435,397,439,425,427,461,498,480,476,487,22,190,232,203,139,218,139,125,133,138,123,8,45,56,105,67,81,64,50,28,46,36,-146,-327,-394,-262,-413,-264,-479,-204,-260,-224,-414,-138,-282,-338,-157,-346,-183,-415,-154,-232,-178,-378,8,1,8,-2,6,0,0,0,0,0,0,589,589,589,589,589,589,589,589,589,589,589,589,12.677099074,12.782734164,13.054087027,11.486410802,13.158297378,12.270440509,12.780666933,12.592052422,12.630626183,12.58653241,8.8232609555,8.0679578109,8.9263928426,8.6555400548,8.7109968685,9.4277884576,10.216327661,9.8600084221,9.7918209496,10.048592269,3.8538381185,4.714776353,4.1276941846,2.8308707473,4.447300509,2.8426520512,2.5643392723,2.7320440003,2.8388052333,2.5379401418,0.9127511333,1.1380494645,2.1350142334,1.3645204322,1.6524373451,1.3088469876,1.0257357089,0.575167158,0.9462684111,0.7428117488,-6.632658236,-8.006990875,-5.327368849,-8.411148336,-5.385721717,-9.795901673,-4.185001692,-5.340837895,-4.607915741,-8.542335111,-5.719907102,-6.868941411,-3.192354616,-7.046627903,-3.733284372,-8.487054685,-3.159265984,-4.765670737,-3.66164733,-7.799523362 +050,2,3,39,151,Ohio,Stark County,375586,375561,375348,374512,374914,375152,375608,374798,373553,372120,371410,370723,369772,-213,-836,402,238,456,-810,-1245,-1433,-710,-687,-951,1060,4075,4080,4044,4323,4235,4224,4111,4083,4033,4040,973,4103,3950,4174,3934,4216,4153,4435,4519,4281,4443,87,-28,130,-130,389,19,71,-324,-436,-248,-403,54,138,176,227,105,184,156,126,40,112,97,-326,-934,178,213,40,-979,-1463,-1225,-302,-553,-649,-272,-796,354,440,145,-795,-1307,-1099,-262,-441,-552,-28,-12,-82,-72,-78,-34,-9,-10,-12,2,4,9264,9334,9362,9390,9282,9098,9081,8999,9045,8838,8812,8792,10.86869549,10.888333204,10.783051092,11.516330119,11.287223183,11.288820353,11.026280957,10.982744476,10.868671788,10.91161993,10.943376097,10.541401019,11.129687254,10.480046886,11.236583929,11.099069822,11.895294586,12.155528358,11.537015602,12.000081027,-0.074680607,0.3469321854,-0.346636163,1.036283233,0.050639254,0.1897505315,-0.869013629,-1.172783882,-0.668343814,-1.088461097,0.3680687062,0.4696928049,0.6052800687,0.2797165539,0.4904011962,0.4169166608,0.3379497447,0.1075948516,0.3018326904,0.2619869142,-2.491131678,0.4750302231,0.5679500204,0.1065586872,-2.60925419,-3.909929966,-3.285622518,-0.812341129,-1.490298909,-1.752881518,-2.123062972,0.944723028,1.1732300891,0.3862752411,-2.118852994,-3.493013305,-2.947672773,-0.704746278,-1.188466218,-1.490894604 +050,2,3,39,153,Ohio,Summit County,541781,541785,541659,541368,540806,542032,542572,541940,541226,541695,541451,540814,538866,-126,-291,-562,1226,540,-632,-714,469,-244,-637,-1948,1570,6068,6115,6122,6200,6089,6112,5919,5961,5849,5804,1271,5362,5644,5611,5474,6001,5820,6007,5943,5891,6298,299,706,471,511,726,88,292,-88,18,-42,-494,174,860,899,1247,1099,1298,1263,1042,734,826,721,-572,-1846,-1881,-457,-1197,-1977,-2253,-458,-986,-1435,-2188,-398,-986,-982,790,-98,-679,-990,584,-252,-609,-1467,-27,-11,-51,-75,-88,-41,-16,-27,-10,14,13,9967,9967,10634,10822,10352,10347,10357,10351,10346,10349,9944,9534,11.205630146,11.301324926,11.307323903,11.432744117,11.229013602,11.285435473,10.93154533,11.006826411,10.808812999,10.751333729,9.9018768692,10.430854927,10.363507745,10.09400666,11.06672863,10.746275271,11.094068727,10.973589895,10.886428001,11.66641968,1.3037532767,0.8704699984,0.9438161572,1.3387374563,0.1622849724,0.5391602026,-0.162523397,0.0332365166,-0.077615002,-0.915085951,1.5881413852,1.6614703366,2.3032069432,2.0265460942,2.3937033431,2.3320525201,1.9244247734,1.3553112877,1.5264283701,1.3355809129,-3.40896395,-3.476335599,-0.844078246,-2.207257211,-3.645879437,-4.16002718,-0.845860409,-1.82062252,-2.651845897,-4.053052756,-1.820822565,-1.814865262,1.459128697,-0.180711117,-1.252176094,-1.827974659,1.0785643643,-0.465311232,-1.125417527,-2.717471844 +050,2,3,39,155,Ohio,Trumbull County,210312,210331,209838,208866,207245,206405,205071,203442,201854,200424,198574,198069,196800,-493,-972,-1621,-840,-1334,-1629,-1588,-1430,-1850,-505,-1269,497,2117,2051,2152,2085,2103,2104,2112,2082,2078,2078,646,2441,2549,2540,2425,2612,2523,2718,2683,2549,2644,-149,-324,-498,-388,-340,-509,-419,-606,-601,-471,-566,6,10,25,24,19,23,29,27,13,18,17,-346,-655,-1150,-450,-997,-1142,-1194,-846,-1264,-51,-720,-340,-645,-1125,-426,-978,-1119,-1165,-819,-1251,-33,-703,-4,-3,2,-26,-16,-1,-4,-5,2,-1,0,3821,3821,3550,3552,3810,3985,3903,3971,3970,3138,3806,3810,10.112155604,9.8579465575,10.404931706,10.134248413,10.295877977,10.382535234,10.500201353,10.436142537,10.477936079,10.52500956,11.659788299,12.251538652,12.280913816,11.786835684,12.787842737,12.450159883,13.513043219,13.448688966,12.852867692,13.391783098,-1.547632695,-2.393592094,-1.87598211,-1.652587271,-2.49196476,-2.06762465,-3.012841866,-3.012546429,-2.374931614,-2.866773538,0.0477664412,0.1201602457,0.1160401305,0.0923504652,0.1126035157,0.143105286,0.1342355287,0.0651632339,0.0907617177,0.0861045055,-3.128701899,-5.527371302,-2.175752448,-4.845969145,-5.591009344,-5.891990052,-4.206046565,-6.335871358,-0.2571582,-3.646779058,-3.080935458,-5.407211057,-2.059712317,-4.75361868,-5.478405828,-5.748884766,-4.071811036,-6.270708124,-0.166396482,-3.560674553 +050,2,3,39,157,Ohio,Tuscarawas County,92582,92585,92545,92491,92426,92625,92682,92782,92602,92377,92075,91993,91776,-40,-54,-65,199,57,100,-180,-225,-302,-82,-217,279,1079,1128,1129,1085,1191,1177,1156,1203,1125,1125,263,945,977,1030,1013,1017,1072,1081,1164,1091,1118,16,134,151,99,72,174,105,75,39,34,7,12,85,61,71,81,91,109,84,86,48,53,-65,-270,-268,45,-85,-156,-391,-383,-426,-165,-279,-53,-185,-207,116,-4,-65,-282,-299,-340,-117,-226,-3,-3,-9,-16,-11,-9,-3,-1,-1,1,2,1250,1250,1250,1250,1250,1250,1251,1251,1251,1251,1251,1251,11.662595387,12.200068139,12.202041599,11.710296967,12.843462882,12.697967462,12.49871607,13.044043979,12.223743399,12.243631951,10.214228583,10.566902989,11.132066295,10.933208136,10.967087952,11.565183619,11.687813211,12.621169735,11.85431471,12.167449352,1.4483668043,1.6331651498,1.0699753041,0.777088831,1.8763749299,1.1327838433,0.8109028592,0.4228742437,0.3694286894,0.0761825988,0.9187401371,0.6597554579,0.7673560262,0.8742249348,0.9813225208,1.1759375135,0.9082112024,0.932491922,0.521546385,0.5768111052,-2.918351024,-2.898597749,0.486352411,-0.917396537,-1.682267179,-4.218271264,-4.141010601,-4.619087893,-1.792815699,-3.036420724,-1.999610887,-2.238842291,1.2537084371,-0.043171602,-0.700944658,-3.04233375,-3.232799399,-3.686595971,-1.271269314,-2.459609619 +050,2,3,39,159,Ohio,Union County,52300,52334,52462,53101,52798,53440,53782,54394,55601,56842,57836,59054,60021,128,639,-303,642,342,612,1207,1241,994,1218,967,161,599,600,606,594,659,653,670,686,707,714,54,327,319,353,354,376,375,379,409,416,416,107,272,281,253,240,283,278,291,277,291,298,5,35,52,91,89,94,112,79,47,68,46,19,332,-665,302,24,240,814,872,674,860,623,24,367,-613,393,113,334,926,951,721,928,669,-3,0,29,-4,-11,-5,3,-1,-4,-1,0,2932,2965,3157,2649,2781,2861,2777,2950,2889,2734,2671,2414,11.348673304,11.331551762,11.408347296,11.079815709,12.183848543,11.873266967,11.917149133,11.963933797,12.096843186,11.992441738,6.1953525383,6.0246083532,6.645456428,6.6031224935,6.9516343736,6.8184917496,6.7411933157,7.1330159228,7.1178030627,6.9871929456,5.1533207658,5.3069434083,4.7628908677,4.4766932159,5.2322141695,5.0547752171,5.1759558176,4.8309178744,4.9790401232,5.0052487928,0.663111128,0.9820678193,1.7131346599,1.6601070676,1.7379085934,2.0364562026,1.4051563903,0.8196864263,1.1634870391,0.7726222969,6.2900826994,-12.55913654,5.6853479922,0.4476693216,4.43721343,14.800672758,15.510080663,11.754652156,14.714689024,10.463993282,6.9531938274,-11.57706872,7.3984826522,2.1077763892,6.1751220234,16.83712896,16.915237053,12.574338583,15.878176063,11.236615578 +050,2,3,39,161,Ohio,Van Wert County,28744,28759,28679,28628,28642,28357,28343,28330,28210,28290,28176,28231,28159,-80,-51,14,-285,-14,-13,-120,80,-114,55,-72,74,312,318,330,349,315,361,363,327,351,340,90,264,291,329,339,331,350,327,340,282,315,-16,48,27,1,10,-16,11,36,-13,69,25,2,8,10,6,8,3,15,14,17,3,8,-68,-107,-22,-294,-29,3,-146,33,-118,-16,-104,-66,-99,-12,-288,-21,6,-131,47,-101,-13,-96,2,0,-1,2,-3,-3,0,-3,0,-1,-1,396,396,396,396,396,396,396,396,396,396,396,396,10.888722146,11.105290728,11.579150511,12.310405644,11.116404637,12.769720552,12.849557522,11.582191053,12.445263886,12.058875687,9.2135341232,10.162388685,11.544062177,11.957671958,11.681047412,12.380615493,11.575221239,12.042645132,9.9987590193,11.172193651,1.6751880224,0.942902043,0.0350883349,0.3527336861,-0.564642775,0.3891050584,1.2743362832,-0.460454079,2.4465048664,0.8866820358,0.2791980037,0.3492229789,0.2105300093,0.2821869489,0.1058705204,0.5305978069,0.4955752212,0.6021322566,0.1063697768,0.2837382515,-3.7342733,-0.768290554,-10.31597046,-1.02292769,0.1058705204,-5.16448532,1.1681415929,-4.179506252,-0.567305476,-3.688597269,-3.455075296,-0.419067575,-10.10544045,-0.740740741,0.2117410407,-4.633887513,1.6637168142,-3.577373995,-0.460935699,-3.404859018 +050,2,3,39,163,Ohio,Vinton County,13435,13430,13405,13380,13223,13305,13210,13083,13015,13080,13132,13028,12972,-25,-25,-157,82,-95,-127,-68,65,52,-104,-56,40,140,130,154,152,149,146,141,153,134,125,44,128,124,152,157,134,149,150,155,148,184,-4,12,6,2,-5,15,-3,-9,-2,-14,-59,0,-1,0,0,0,0,0,0,0,0,0,-20,-36,-165,80,-92,-143,-64,75,54,-90,3,-20,-37,-165,80,-92,-143,-64,75,54,-90,3,-1,0,2,0,2,1,-1,-1,0,0,0,68,68,68,68,68,68,68,68,68,68,68,68,10.453612096,9.7733338345,11.610373945,11.465208373,11.333815084,11.188596827,10.806667944,11.674042423,10.244648318,9.6153846154,9.5575882024,9.3222568883,11.459589867,11.842353385,10.192826988,11.418499502,11.49645526,11.826644285,11.314984709,14.153846154,0.896023894,0.4510769462,0.1507840772,-0.377145012,1.1409880957,-0.229902675,-0.689787316,-0.152601862,-1.070336391,-4.538461538,-0.074668658,0,0,0,0,0,0,0,0,0,-2.688071682,-12.40461602,6.0313630881,-6.939468226,-10.87741985,-4.90459039,5.7482276298,4.1202502671,-6.880733945,0.2307692308,-2.76274034,-12.40461602,6.0313630881,-6.939468226,-10.87741985,-4.90459039,5.7482276298,4.1202502671,-6.880733945,0.2307692308 +050,2,3,39,165,Ohio,Warren County,212693,212795,213445,215377,217293,219298,221429,224018,226858,229292,232539,235601,238412,650,1932,1916,2005,2131,2589,2840,2434,3247,3062,2811,649,2485,2407,2455,2357,2344,2435,2306,2407,2360,2360,357,1388,1494,1567,1580,1654,1646,1846,1879,1819,2019,292,1097,913,888,777,690,789,460,528,541,341,74,319,412,596,499,539,648,547,353,450,365,286,524,636,551,900,1382,1413,1448,2378,2075,2106,360,843,1048,1147,1399,1921,2061,1995,2731,2525,2471,-2,-8,-45,-30,-45,-22,-10,-21,-12,-4,-1,6140,6140,6136,5857,5972,5784,5783,5843,5549,5589,5787,5248,11.589890444,11.12626251,11.246223582,10.695963714,10.524259901,10.801195894,10.110709197,10.423726428,10.082453967,9.9575328103,6.4735484653,6.9059560404,7.1783431175,7.1699714336,7.4262482405,7.3013422759,8.0938287844,8.1371757201,7.7711795617,8.5187537051,5.1163419787,4.2203064691,4.0678804648,3.5259922809,3.0980116602,3.4998536183,2.0168804121,2.2865507079,2.3112744051,1.4387791052,1.4877968015,1.9044537407,2.7302440957,2.2644403452,2.4200409925,2.8744044926,2.3983338814,1.5286977271,1.9225018157,1.5400421507,2.4439044639,2.9398849007,2.5241015046,4.0841609432,6.2050030643,6.2677986852,6.3487887756,10.298139363,8.8648694835,8.8858322451,3.9317012653,4.8443386415,5.2543456003,6.3486012883,8.6250440569,9.1422031778,8.747122657,11.82683709,10.787371299,10.425874396 +050,2,3,39,167,Ohio,Washington County,61778,61787,61714,61617,61472,61401,61204,61075,60673,60557,60183,60018,59652,-73,-97,-145,-71,-197,-129,-402,-116,-374,-165,-366,147,623,616,645,613,574,610,616,587,593,592,149,733,717,711,686,764,762,775,770,741,782,-2,-110,-101,-66,-73,-190,-152,-159,-183,-148,-190,4,6,11,28,29,47,44,35,20,32,27,-71,10,-46,-23,-146,21,-290,12,-211,-45,-206,-67,16,-35,5,-117,68,-246,47,-191,-13,-179,-4,-3,-9,-10,-7,-7,-4,-4,0,-4,3,1781,1778,1767,1787,1842,1754,1719,1561,1724,1673,1523,1587,10.102893839,10.009017865,10.498644942,9.9995921863,9.38836595,10.020698492,10.162501031,9.723372536,9.8668064326,9.8938748224,11.88671137,11.650106833,11.57292489,11.190408222,12.496013216,12.517659428,12.785614122,12.754679477,12.329348342,13.069273836,-1.783817532,-1.641088968,-1.074279948,-1.190816035,-3.107647266,-2.496960936,-2.623113091,-3.031306941,-2.462541909,-3.175399014,0.0972991381,0.1787324619,0.4557551293,0.4730639044,0.7687337973,0.7228044814,0.5774148313,0.331290376,0.5324414938,0.4512409125,0.1621652302,-0.747426659,-0.374370285,-2.38163207,0.343476803,-4.763938627,0.1979707993,-3.495113467,-0.748745851,-3.442801036,0.2594643682,-0.568694197,0.0813848445,-1.908568166,1.1122106003,-4.041134146,0.7753856306,-3.163823091,-0.216304357,-2.991560124 +050,2,3,39,169,Ohio,Wayne County,114520,114531,114409,114670,115058,115438,115957,116262,116657,116227,115911,115824,115694,-122,261,388,380,519,305,395,-430,-316,-87,-130,326,1458,1559,1571,1553,1592,1543,1549,1485,1459,1428,294,1038,1021,1092,1017,1117,1098,1165,1198,1210,1249,32,420,538,479,536,475,445,384,287,249,179,9,91,118,168,118,122,118,82,46,77,54,-163,-244,-259,-257,-119,-282,-164,-901,-648,-416,-365,-154,-153,-141,-89,-1,-160,-46,-819,-602,-339,-311,0,-6,-9,-10,-16,-10,-4,5,-1,3,2,3231,3231,3480,3619,3612,3609,3744,3835,3564,3593,3568,3365,12.729233147,13.572572782,13.631472997,13.422934808,13.711195036,13.249241153,13.302760172,12.794113846,12.591969275,12.335973877,9.0623758616,8.8887728096,9.4752186589,8.7901640053,9.6202291802,9.4281703081,10.004981021,10.321446726,10.442962867,10.789657824,3.666857285,4.6837999721,4.1562543385,4.6327708032,4.0909658555,3.8210708444,3.2977791519,2.4726671204,2.1490064082,1.5463160532,0.7944857451,1.0273018526,1.4577259475,1.019901035,1.0507322829,1.0132277745,0.7042132564,0.3963159845,0.6645521824,0.4664864071,-2.13026947,-2.254840507,-2.229973622,-1.028544264,-2.428741834,-1.408214873,-7.737757854,-5.582886042,-3.590307895,-3.153102567,-1.335783725,-1.227538654,-0.772247675,-0.008643229,-1.378009551,-0.394987099,-7.033544597,-5.186570057,-2.925755712,-2.686616159 +050,2,3,39,171,Ohio,Williams County,37642,37652,37510,37587,37531,37446,37222,37036,36964,36754,36753,36765,36565,-142,77,-56,-85,-224,-186,-72,-210,-1,12,-200,101,448,445,428,431,415,429,412,405,433,419,126,343,356,385,410,401,389,469,466,399,410,-25,105,89,43,21,14,40,-57,-61,34,9,2,1,0,-1,2,-1,-3,13,9,11,12,-124,-28,-146,-127,-246,-199,-109,-163,51,-33,-219,-122,-27,-146,-128,-244,-200,-112,-150,60,-22,-207,5,-1,1,0,-1,0,0,-3,0,0,-2,990,990,990,990,990,990,990,990,990,990,989,990,11.931235602,11.848025773,11.416834496,11.544436706,11.177246896,11.594594595,11.177731355,11.019358701,11.779428167,11.427792172,9.1348522577,9.4784206182,10.269816077,10.981946751,10.800183145,10.513513514,12.724165061,12.679064579,10.854484616,11.182326469,2.7963833442,2.3696051546,1.147018419,0.5624899555,0.3770637507,1.0810810811,-1.546433707,-1.659705878,0.9249435512,0.245465703,0.0266322223,0,-0.026674847,0.053570472,-0.026933125,-0.081081081,0.3526954068,0.2448746378,0.299246443,0.327287604,-0.745702225,-3.887217445,-3.387705563,-6.589168051,-5.359691885,-2.945945946,-4.422257793,1.3876229475,-0.897739329,-5.972998773,-0.719070003,-3.887217445,-3.41438041,-6.535597579,-5.38662501,-3.027027027,-4.069562386,1.6324975853,-0.598492886,-5.645711169 +050,2,3,39,173,Ohio,Wood County,125488,125490,125956,127150,128471,129073,129410,129375,129888,130593,130627,131089,131113,466,1194,1321,602,337,-35,513,705,34,462,24,319,1298,1375,1364,1409,1387,1373,1374,1344,1266,1265,207,1018,972,995,1069,1132,1161,1153,1200,1162,1182,112,280,403,369,340,255,212,221,144,104,83,40,152,182,240,219,214,230,187,114,154,133,293,762,732,4,-217,-505,76,302,-225,203,-197,333,914,914,244,2,-291,306,489,-111,357,-64,21,0,4,-11,-5,1,-5,-5,1,1,5,6230,6650,7123,7613,7381,7148,6749,6854,7156,6812,6655,6435,10.256572345,10.758114552,10.5923648,10.902070929,10.71932299,10.591561465,10.549713799,10.290176862,9.6746091183,9.6490492063,8.0440605912,7.6050089781,7.7268350262,8.2713369931,8.748575072,8.9561564897,8.8528529912,9.1876579129,8.8798544988,9.0159495351,2.212511754,3.1531055743,2.8655297736,2.6307339361,1.9707479182,1.6354049749,1.6968608075,1.1025189495,0.7947546195,0.6330996712,1.2010778093,1.4239831626,1.8637592023,1.6945021529,1.6538825666,1.7742601142,1.4358052987,0.8728275017,1.1768481866,1.0144850154,6.0211927019,5.7272289835,0.0310626534,-1.679027247,-3.90285372,0.5862772551,2.3187871668,-1.722685859,1.5512998823,-1.502658256,7.2222705112,7.1512121461,1.8948218557,0.0154749055,-2.248971154,2.3605373694,3.7545924655,-0.849858357,2.7281480689,-0.48817324 +050,2,3,39,175,Ohio,Wyandot County,22615,22616,22587,22643,22544,22463,22287,22181,22070,22057,21901,21796,21711,-29,56,-99,-81,-176,-106,-111,-13,-156,-105,-85,66,242,263,302,238,251,246,253,219,227,223,71,209,223,244,247,266,246,263,258,253,263,-5,33,40,58,-9,-15,0,-10,-39,-26,-40,0,-1,-4,2,15,11,8,8,12,-2,2,-23,25,-136,-142,-184,-101,-118,-10,-129,-77,-47,-23,24,-140,-140,-169,-90,-110,-2,-117,-79,-45,-1,-1,1,1,2,-1,-1,-1,0,0,0,251,251,251,251,251,251,251,251,251,251,251,251,10.70086226,11.640516078,13.420134646,10.636871508,11.289016821,11.118392805,11.46690235,9.9640565995,10.389729272,10.251223941,9.2416537696,9.8700953814,10.842757793,11.039106145,11.963659261,11.118392805,11.920139597,11.738477638,11.579742316,12.090008504,1.4592084899,1.7704206962,2.5773768525,-0.402234637,-0.67464244,0,-0.453237247,-1.774421038,-1.190013044,-1.838784563,-0.044218439,-0.17704207,0.0888750639,0.6703910615,0.494737789,0.3615737497,0.3625897976,0.5459757041,-0.091539465,0.0919392282,1.1054609772,-6.019430367,-6.310129535,-8.223463687,-4.542592426,-5.333212809,-0.453237247,-5.869238819,-3.524269401,-2.160571862,1.0612425381,-6.196472437,-6.221254472,-7.553072626,-4.047854637,-4.971639059,-0.090647449,-5.323263115,-3.615808866,-2.068632634 +040,3,7,40,000,Oklahoma,Oklahoma,3751351,3751582,3760014,3788824,3819320,3853891,3879187,3910518,3928143,3933602,3943488,3960676,3980783,8432,28810,30496,34571,25296,31331,17625,5459,9886,17188,20107,13147,52564,52335,53322,53083,53501,53155,51123,50123,49382,49033,7876,37764,36978,38599,38612,39741,39291,40317,41531,40470,43466,5271,14800,15357,14723,14471,13760,13864,10806,8592,8912,5567,1295,7029,6906,5987,6760,9593,8011,4850,4875,3325,2821,1537,7003,8116,13615,4195,8037,-4150,-10152,-3530,4926,11682,2832,14032,15022,19602,10955,17630,3861,-5302,1345,8251,14503,329,-22,117,246,-130,-59,-100,-45,-51,25,37,112276,110214,110189,109863,109622,109610,109292,109433,109786,109890,109769,109811,13.926381782,13.757626039,13.898223312,13.728815357,13.73633533,13.56226529,13.005509591,12.726273281,12.495186082,12.348612516,10.00524849,9.7206362025,10.060716433,9.9861917855,10.203467269,10.024926451,10.256501578,10.544757011,10.240172142,10.946603137,3.9211332923,4.0369898362,3.8375068795,3.7426235711,3.5328680611,3.5373388389,2.7490080129,2.1815162706,2.2550139395,1.4020093789,1.8622733724,1.8154230519,1.5604940357,1.7483335872,2.4629944266,2.0439715405,1.2338227709,1.2377667387,0.8413286971,0.7104487979,1.855384895,2.1335032565,3.5487099208,1.0849496151,2.0634927767,-1.058854312,-2.582632736,-0.896270069,1.2464316277,2.9420286625,3.7176582674,3.9489263084,5.1092039565,2.8332832024,4.5264872033,0.9851172286,-1.348809965,0.3414966695,2.0877603248,3.6524774604 +050,3,7,40,001,Oklahoma,Adair County,22683,22671,22760,22668,22466,22463,22392,22266,22301,22122,22251,22224,21955,89,-92,-202,-3,-71,-126,35,-179,129,-27,-269,100,346,334,351,318,315,309,343,320,299,298,28,225,255,225,241,266,253,280,269,274,291,72,121,79,126,77,49,56,63,51,25,7,0,0,4,2,4,9,4,1,2,2,1,19,-214,-291,-131,-153,-183,-23,-242,76,-54,-276,19,-214,-287,-129,-149,-174,-19,-241,78,-52,-275,-2,1,6,0,1,-1,-2,-1,0,0,-1,92,92,92,92,92,92,92,92,92,92,92,92,15.232896011,14.800372225,15.624652229,14.179021291,14.107214833,13.866762403,15.442450983,14.42318527,13.445756043,13.490572444,9.9057849784,11.299685381,10.015802711,10.745736261,11.912759192,11.353692194,12.606082435,12.124490118,12.321528949,13.173679803,5.3271110328,3.5006868436,5.6088495181,3.4332850295,2.1944556406,2.5130702089,2.8363685478,2.2986951525,1.1242270939,0.3168926413,0,0.1772499668,0.0890293574,0.1783524691,0.4030632809,0.1795050149,0.045021723,0.0901449079,0.0899381675,0.0452703773,-9.421502157,-12.89493508,-5.831422912,-6.821981942,-8.195620046,-1.032153836,-10.89525696,3.4255065017,-2.428330523,-12.49462414,-9.421502157,-12.71768512,-5.742393554,-6.643629473,-7.792556765,-0.852648821,-10.85023524,3.5156514096,-2.338392355,-12.44935377 +050,3,7,40,003,Oklahoma,Alfalfa County,5642,5639,5627,5645,5665,5852,5817,5912,5926,5905,5742,5664,5718,-12,18,20,187,-35,95,14,-21,-163,-78,54,14,50,58,65,59,68,63,49,56,46,49,28,75,68,81,74,55,49,56,67,52,55,-14,-25,-10,-16,-15,13,14,-7,-11,-6,-6,-1,-1,-1,-2,0,9,12,9,8,8,5,5,43,30,201,-20,73,-11,-23,-160,-80,56,4,42,29,199,-20,82,1,-14,-152,-72,61,-2,1,1,4,0,0,-1,0,0,0,-1,1054,1054,1054,1054,1054,1054,1054,1052,1051,1051,1051,1051,8.8715400994,10.256410256,11.287661717,10.112263262,11.595191406,10.643689812,8.2833234722,9.6162101829,8.0659302122,8.6100861009,13.307310149,12.024756852,14.066163063,12.68317765,9.3784636371,8.2784254097,9.4666553968,11.505108612,9.1180080659,9.6643823581,-4.43577005,-1.768346596,-2.778501346,-2.570914389,2.2167277688,2.3652644028,-1.183331925,-1.888898429,-1.052077854,-1.054296257,-0.177430802,-0.17683466,-0.347312668,0,1.5346576861,2.0273694881,1.5214267602,1.3737443118,1.4027704717,0.8785802144,7.6295244855,5.3050397878,34.904923157,-3.427885851,12.447779009,-1.858422031,-3.888090609,-27.47488624,-14.02770472,9.840098401,7.4520936835,5.1282051282,34.557610489,-3.427885851,13.982436695,0.1689474573,-2.366663849,-26.10114192,-12.62493425,10.718678615 +050,3,7,40,005,Oklahoma,Atoka County,14182,14165,14214,14171,14031,13903,13924,13888,13882,13771,13771,13738,13912,49,-43,-140,-128,21,-36,-6,-111,0,-33,174,48,173,162,150,163,170,149,154,168,159,154,22,147,137,174,145,192,189,183,160,144,139,26,26,25,-24,18,-22,-40,-29,8,15,15,2,12,4,8,6,14,0,0,0,-1,-1,20,-82,-171,-114,0,-27,35,-81,-8,-47,162,22,-70,-167,-106,6,-13,35,-81,-8,-48,161,1,1,2,2,-3,-1,-1,-1,0,0,-2,750,750,750,750,750,750,750,749,749,749,748,749,12.189536727,11.488546912,10.739600487,11.715240594,12.224938875,10.731004681,11.13803204,12.199549779,11.559853139,11.139240506,10.357583231,9.7156230055,12.457936565,10.421533043,13.806989789,13.611811307,13.235453658,11.618618837,10.469300956,10.054249548,1.8319534966,1.7729239061,-1.718336078,1.2937075502,-1.582050913,-2.880806626,-2.097421618,0.5809309418,1.0905521829,1.0849909584,0.8455169984,0.283667825,0.5727786926,0.4312358501,1.0067596721,0,0,0,-0.072703479,-0.072332731,-5.777699489,-12.12679952,-8.16209637,0,-1.941607939,2.5207057976,-5.858315553,-0.580930942,-3.417063506,11.717902351,-4.932182491,-11.84313169,-7.589317677,0.4312358501,-0.934848267,2.5207057976,-5.858315553,-0.580930942,-3.489766985,11.64556962 +050,3,7,40,007,Oklahoma,Beaver County,5636,5636,5631,5635,5592,5566,5535,5460,5437,5363,5313,5308,5207,-5,4,-43,-26,-31,-75,-23,-74,-50,-5,-101,9,78,56,71,68,57,54,59,52,50,49,23,45,50,46,47,52,52,54,64,44,54,-14,33,6,25,21,5,2,5,-12,6,-5,0,-1,2,2,11,12,17,11,11,9,8,9,-27,-53,-55,-65,-93,-42,-91,-49,-20,-104,9,-28,-51,-53,-54,-81,-25,-80,-38,-11,-96,0,-1,2,2,2,1,0,1,0,0,0,43,43,43,43,43,43,43,43,43,43,43,43,13.846973194,9.9759508328,12.726295035,12.251148545,10.36834925,9.9109846747,10.925925926,9.7414762083,9.4153092929,9.3200190204,7.988638381,8.9070989579,8.2452052339,8.4677056121,9.4588449295,9.5439111682,10,11.989509179,8.2854721778,10.271041369,5.8583348127,1.0688518749,4.481089801,3.7834429331,0.9095043201,0.3670735065,0.9259259259,-2.248032971,1.1298371151,-0.951022349,-0.177525297,0.3562839583,0.3584871841,1.9818034411,2.1828103683,3.120124805,2.037037037,2.0606968902,1.6947556727,1.5216357584,-4.793183029,-9.441524895,-9.858397562,-11.7106567,-16.91678035,-7.708543636,-16.85185185,-9.179467966,-3.766123717,-19.78126486,-4.970708326,-9.085240937,-9.499910378,-9.728853256,-14.73396999,-4.588418831,-14.81481481,-7.118771075,-2.071368044,-18.2596291 +050,3,7,40,009,Oklahoma,Beckham County,22119,22119,22056,22311,23078,23482,23611,23564,22467,21793,21738,21834,21468,-63,255,767,404,129,-47,-1097,-674,-55,96,-366,95,347,348,392,396,342,359,284,310,283,295,36,220,248,248,248,243,231,264,241,244,280,59,127,100,144,148,99,128,20,69,39,15,4,3,-3,-3,7,8,8,-3,-2,-4,-3,-132,125,645,258,-21,-154,-1240,-693,-122,63,-375,-128,128,642,255,-14,-146,-1232,-696,-124,59,-378,6,0,25,5,-5,0,7,2,0,-2,-3,1907,1911,1909,1921,1924,1925,1922,1928,1929,1929,1927,1926,15.642256632,15.334111789,16.838487973,16.817786083,14.499205087,15.598183833,12.833258021,14.242723576,12.989993574,13.62523671,9.9172808619,10.927757827,10.652920962,10.53235088,10.302066773,10.036714388,11.929507456,11.072568974,11.199853117,12.932428063,5.7249757703,4.4063539624,6.1855670103,6.2854352027,4.1971383148,5.5614694445,0.9037505648,3.1701546025,1.7901404572,0.6928086463,0.1352356481,-0.132190619,-0.128865979,0.2972840974,0.3391626921,0.3475918403,-0.135562585,-0.091888539,-0.183604149,-0.138561729,5.6348186715,28.420983058,11.082474227,-0.891852292,-6.528881823,-53.87673524,-31.31495707,-5.605200891,2.8917653539,-17.32021616,5.7700543197,28.288792439,10.953608247,-0.594568195,-6.189719131,-53.5291434,-31.45051966,-5.697089431,2.7081612044,-17.45877789 +050,3,7,40,011,Oklahoma,Blaine County,11943,11943,9911,9689,9811,9792,9845,9772,9649,9560,9490,9457,9447,-2032,-222,122,-19,53,-73,-123,-89,-70,-33,-10,41,138,132,173,162,164,137,126,110,138,129,14,125,125,128,134,137,108,147,141,109,114,27,13,7,45,28,27,29,-21,-31,29,15,5,21,19,5,7,17,62,43,26,22,20,-2337,-256,96,-68,21,-120,-213,-112,-66,-82,-45,-2332,-235,115,-63,28,-103,-151,-69,-40,-60,-25,273,0,0,-1,-3,3,-1,1,1,-2,0,2190,107,107,107,107,107,107,107,107,107,107,107,14.081632653,13.538461538,17.650359639,16.499465295,16.72019167,14.108439318,13.118850539,11.54855643,14.566949913,13.647905205,12.755102041,12.820512821,13.059225629,13.647705861,13.967477188,11.12198136,15.305325629,14.803149606,11.505779279,12.060939484,1.3265306122,0.7179487179,4.5911340101,2.8517594337,2.7527144823,2.9864579579,-2.18647509,-3.254593176,3.0611706339,1.5869657215,2.1428571429,1.9487179487,0.5101260011,0.7129398584,1.7331906,6.3848411513,4.477068041,2.7296587927,2.3222673774,2.1159542954,-26.12244898,9.8461538462,-6.937713615,2.1388195753,-12.23428659,-21.93501879,-11.66120048,-6.929133858,-8.655723861,-4.760897165,-23.97959184,11.794871795,-6.427587614,2.8517594337,-10.50109599,-15.55017764,-7.184132438,-4.199475066,-6.333456484,-2.644942869 +050,3,7,40,013,Oklahoma,Bryan County,42416,42416,42579,43128,43471,44149,44525,45080,45679,46571,47290,48089,48998,163,549,343,678,376,555,599,892,719,799,909,134,593,638,569,597,569,595,604,590,588,597,84,469,445,503,524,498,518,522,562,535,601,50,124,193,66,73,71,77,82,28,53,-4,4,20,40,8,31,48,48,27,27,17,17,102,404,117,593,274,435,475,780,664,727,900,106,424,157,601,305,483,523,807,691,744,917,7,1,-7,11,-2,1,-1,3,0,2,-4,1134,1134,1134,1134,1134,1134,1134,1134,1135,1135,1136,1137,13.837842883,14.734581231,12.987902305,13.465051763,12.700184142,13.11164733,13.094850949,12.571781677,12.329758123,12.298247963,10.944263596,10.277254934,11.481396941,11.818571396,11.115451147,11.414845911,11.317073171,11.97515475,11.218402374,12.380648285,2.8935792876,4.4573262971,1.5065053641,1.6464803663,1.5847329948,1.6968014191,1.7777777778,0.5966269271,1.1113557492,-0.082400321,0.4667063367,0.9237981963,0.1826067108,0.6991902925,1.0713687852,1.0577463392,0.5853658537,0.5753188225,0.3564725988,0.3502013658,9.4274680014,2.7021097241,13.535722438,6.179940005,9.7092796161,10.467281482,16.910569106,14.148581413,15.244445842,18.540072306,9.8941743382,3.6259079204,13.718329149,6.8791302975,10.780648401,11.525027821,17.495934959,14.723900235,15.600918441,18.890273672 +050,3,7,40,015,Oklahoma,Caddo County,29600,29605,29711,29614,29741,29590,29448,29439,29696,29420,29166,28927,28684,106,-97,127,-151,-142,-9,257,-276,-254,-239,-243,116,460,396,402,402,380,429,425,370,392,368,43,353,362,357,362,354,368,374,388,384,386,73,107,34,45,40,26,61,51,-18,8,-18,0,-3,15,16,26,58,126,82,65,50,41,34,-201,86,-213,-206,-94,71,-409,-302,-297,-265,34,-204,101,-197,-180,-36,197,-327,-237,-247,-224,-1,0,-8,1,-2,1,-1,0,1,0,-1,1935,1935,1935,1939,1933,1932,1928,1929,1928,1928,1925,1927,15.507796039,13.343442002,13.551094706,13.618347505,12.906074346,14.509173924,14.378510048,12.631003994,13.49560188,12.775338043,11.90054783,12.197792941,12.034181119,12.263288052,12.023027154,12.446097912,12.653088842,13.24548527,13.220181433,13.400218708,3.607248209,1.1456490607,1.5169135865,1.3550594532,0.8830471921,2.0630760125,1.7254212058,-0.614481275,0.2754204465,-0.624880665,-0.1011378,0.5054334091,0.539347053,0.8807886446,1.9698745054,4.261435698,2.7742066446,2.2189601611,1.7213777908,1.4233392928,-6.776232617,2.8978182125,-7.180057643,-6.978556184,-3.192555233,2.4012851949,-13.83720143,-10.30963029,-10.22498408,-9.199632015,-6.877370417,3.4032516216,-6.64071059,-6.09776754,-1.222680727,6.6627208929,-11.06299479,-8.090670126,-8.503606286,-7.776292722 +050,3,7,40,017,Oklahoma,Canadian County,115541,115566,116360,119414,122526,125992,129384,133241,136508,140146,144570,148635,153192,794,3054,3112,3466,3392,3857,3267,3638,4424,4065,4557,382,1571,1592,1720,1687,1731,1778,1750,1799,1908,1891,164,857,842,918,889,944,971,966,1110,1118,1228,218,714,750,802,798,787,807,784,689,790,663,19,94,64,91,82,144,141,90,100,52,60,524,2233,2236,2517,2453,2892,2314,2751,3632,3229,3855,543,2327,2300,2608,2535,3036,2455,2841,3732,3281,3915,33,13,62,56,59,34,5,13,3,-6,-21,2488,2488,2488,2488,2487,2484,2484,2482,2480,2481,2481,2482,13.326320968,13.160287675,13.842055706,13.211891485,13.182294146,13.182625329,12.65118162,12.637154217,13.014784877,12.530356794,7.2696735009,6.9604034058,7.3877948479,6.962283065,7.1889576392,7.1992852615,6.9834522544,7.797243569,7.6260636756,8.1371116567,6.0566474675,6.1998842688,6.4542608584,6.2496084205,5.9933365064,5.983340068,5.6677293659,4.8399106478,5.3887212019,4.3932451371,0.7973737562,0.5290567909,0.7323413193,0.642190339,1.0966206568,1.0454162944,0.6506321976,0.7024543756,0.3547006361,0.3975787454,18.94186806,18.483921633,20.256078031,19.210889042,22.023798191,17.156690108,19.887657507,25.513142921,22.025545267,25.544434395,19.739241816,19.012978424,20.98841935,19.853079381,23.120418848,18.202106403,20.538289705,26.215597297,22.380245903,25.94201314 +050,3,7,40,019,Oklahoma,Carter County,47557,47729,47810,48067,48028,48474,48600,48587,48501,48373,48345,48328,48353,81,257,-39,446,126,-13,-86,-128,-28,-17,25,155,619,624,664,691,717,709,630,639,656,654,111,632,589,642,625,631,602,592,616,601,700,44,-13,35,22,66,86,107,38,23,55,-46,14,33,17,15,25,45,59,56,65,41,33,29,236,-81,405,47,-138,-250,-223,-114,-114,35,43,269,-64,420,72,-93,-191,-167,-49,-73,68,-6,1,-10,4,-12,-6,-2,1,-2,1,3,913,913,913,913,913,913,913,913,913,913,913,913,12.912377317,12.987148135,13.761372821,14.236561798,14.755059833,14.605306526,13.006585874,13.213672739,13.571524624,13.529028454,13.1835581,12.258702326,13.305423722,12.87677442,12.985275808,12.401120633,12.222061647,12.738063235,12.433668139,14.480611496,-0.271180784,0.7284458088,0.4559490995,1.3597873787,1.7697840246,2.2041858932,0.7845242273,0.4756095039,1.1378564853,-0.951583041,0.6883819894,0.3538165357,0.310874386,0.5150709768,0.9260497803,1.2153922215,1.1561409666,1.3441138154,0.848220289,0.6826573991,4.9229742274,-1.685831729,8.3936084226,0.9683334363,-2.839885993,-5.14996704,-4.603918492,-2.357368846,-2.358466169,0.7240305748,5.6113562168,-1.332015193,8.7044828086,1.4834044131,-1.913836213,-3.934574819,-3.447777525,-1.01325503,-1.51024588,1.4066879739 +050,3,7,40,021,Oklahoma,Cherokee County,46987,46992,47126,47707,47997,47880,48253,48392,48868,48956,48692,48819,49019,134,581,290,-117,373,139,476,88,-264,127,200,150,633,646,594,612,526,638,551,546,612,581,110,459,454,545,496,540,476,504,558,517,543,40,174,192,49,116,-14,162,47,-12,95,38,4,13,18,18,48,76,83,63,66,50,35,89,395,83,-183,214,83,233,-21,-315,-20,124,93,408,101,-165,262,159,316,42,-249,30,159,1,-1,-3,-1,-5,-6,-2,-1,-3,2,3,2008,2009,2007,2008,2008,2009,2010,2010,2013,2011,2011,2013,13.349783303,13.499958204,12.39087581,12.732360376,10.885198407,13.119473576,11.265129212,11.183024742,12.552429982,11.876775895,9.6801746228,9.4875867257,11.368732856,10.319037167,11.174918516,9.7881965865,10.304219823,11.428805505,10.603931864,11.099981602,3.6696086805,4.0123714787,1.022142954,2.4133232085,-0.28972011,3.3312769895,0.9609093883,-0.245780764,1.9484981182,0.7767942926,0.2741661658,0.3761598261,0.3754810851,0.9986165001,1.5727663097,1.7067653712,1.2880274779,1.3517941996,1.0255253253,0.7154684274,8.3304334989,1.7345147538,-3.817391032,4.4521652294,1.7176263645,4.7912811022,-0.429342493,-6.451745043,-0.41021013,2.5348024285,8.6045996647,2.11067458,-3.441909947,5.4507817295,3.2903926742,6.4980464734,0.8586849853,-5.099950844,0.6153151952,3.2502708559 +050,3,7,40,023,Oklahoma,Choctaw County,15205,15199,15234,15280,15177,15053,15114,14987,14874,14807,14666,14642,14646,35,46,-103,-124,61,-127,-113,-67,-141,-24,4,56,216,190,209,166,206,205,210,209,197,197,38,195,216,222,232,234,246,224,209,190,238,18,21,-26,-13,-66,-28,-41,-14,0,7,-41,1,3,3,2,0,0,0,0,0,0,0,16,24,-80,-114,127,-97,-70,-52,-142,-31,45,17,27,-77,-112,127,-97,-70,-52,-142,-31,45,0,-2,0,1,0,-2,-2,-1,1,0,0,172,172,172,172,172,172,172,172,172,172,172,172,14.157435931,12.476606363,13.82732385,11.005403255,13.687252915,13.730283648,14.150466628,14.182472093,13.443428415,13.452608577,12.781018549,14.183931444,14.687396626,15.381045513,15.547656224,16.476340377,15.09383107,14.182472093,12.965743142,16.252390057,1.3764173822,-1.707325081,-0.860072775,-4.375642258,-1.860403309,-2.74605673,-0.943364442,0,0.4776852736,-2.79978148,0.1966310546,0.1969990478,0.1323188885,0,0,0,0,0,0,0,1.5730484368,-5.253307942,-7.542176646,8.4197964663,-6.444968606,-4.688389538,-3.50392507,-9.635937977,-2.115463355,3.0729308932,1.7696794914,-5.056308895,-7.409857757,8.4197964663,-6.444968606,-4.688389538,-3.50392507,-9.635937977,-2.115463355,3.0729308932 +050,3,7,40,025,Oklahoma,Cimarron County,2475,2475,2472,2477,2398,2327,2294,2225,2181,2155,2165,2148,2145,-3,5,-79,-71,-33,-69,-44,-26,10,-17,-3,13,40,25,35,26,34,17,26,30,25,28,5,38,26,44,29,34,37,32,21,11,17,8,2,-1,-9,-3,0,-20,-6,9,14,11,1,2,0,0,1,2,2,2,2,2,1,-13,1,-79,-64,-31,-73,-26,-21,-1,-33,-15,-12,3,-79,-64,-30,-71,-24,-19,1,-31,-14,1,0,1,2,0,2,0,-1,0,0,0,7,7,7,7,7,7,7,7,7,7,7,7,16.164881794,10.256410256,14.814814815,11.252975546,15.047576898,7.7167498865,11.992619926,13.888888889,11.592858799,13.044491032,15.356637705,10.666666667,18.624338624,12.551395802,15.047576898,16.795279165,14.760147601,9.7222222222,5.1008578716,7.9198695551,0.8082440897,-0.41025641,-3.80952381,-1.298420255,0,-9.078529278,-2.767527675,4.1666666667,6.4920009274,5.1246214768,0.8082440897,0,0,0.4328067518,0.8851515822,0.9078529278,0.9225092251,0.9259259259,0.9274287039,0.4658746797,0.4041220449,-32.41025641,-27.08994709,-13.41700931,-32.30803275,-11.80208806,-9.686346863,-0.462962963,-15.30257361,-6.988120196,1.2123661346,-32.41025641,-27.08994709,-12.98420255,-31.42288117,-10.89423513,-8.763837638,0.462962963,-14.37514491,-6.522245516 +050,3,7,40,027,Oklahoma,Cleveland County,255755,255991,257094,262098,266224,269966,269874,274041,278062,279723,281559,284537,287066,1103,5004,4126,3742,-92,4167,4021,1661,1836,2978,2529,766,3003,3015,3123,2984,2933,3004,2912,2840,2784,2800,391,1797,1778,1905,1864,1921,1978,1926,2056,2171,2346,375,1206,1237,1218,1120,1012,1026,986,784,613,454,121,678,669,670,668,893,491,265,330,224,188,577,3100,2197,1836,-1889,2257,2502,424,730,2138,1875,698,3778,2866,2506,-1221,3150,2993,689,1060,2362,2063,30,20,23,18,9,5,2,-14,-8,3,12,10561,10563,10562,10551,10543,10541,10538,10539,10539,10543,10540,10547,11.567974853,11.413494043,11.648855816,11.055127445,10.784773356,10.882027448,10.441299067,10.11969028,9.8357875696,9.7970094629,6.9222946424,6.730743751,7.1056901471,6.9057498518,7.0636036881,7.1653296577,6.9058866768,7.3260856397,7.6700771601,8.2084943571,4.6456802108,4.6827502924,4.5431656689,4.1493775934,3.7211696681,3.7166977901,3.5354123901,2.7936046408,2.1657104095,1.5885151058,2.6117505663,2.5325464395,2.49911412,2.4748073503,3.283601298,1.7786536208,0.9501869,1.1758795044,0.7913852067,0.6577992068,11.941632383,8.3168976495,6.848318693,-6.998369887,8.2990908506,9.0635261899,1.52029904,2.6011879946,7.5534891608,6.5604974082,14.553382949,10.849444089,9.347432813,-4.523562537,11.582692149,10.842179811,2.4704859399,3.777067499,8.3448743676,7.218296615 +050,3,7,40,029,Oklahoma,Coal County,5925,5927,5911,5926,5899,5756,5722,5600,5643,5623,5519,5511,5587,-16,15,-27,-143,-34,-122,43,-20,-104,-8,76,13,67,60,65,62,67,78,75,69,78,75,18,93,69,64,81,89,94,93,85,64,83,-5,-26,-9,1,-19,-22,-16,-18,-16,14,-8,0,1,0,0,0,0,1,1,1,1,0,-12,40,-18,-147,-14,-102,59,-4,-88,-23,84,-12,41,-18,-147,-14,-102,60,-3,-87,-22,84,1,0,0,3,-1,2,-1,1,-1,0,0,61,61,61,61,61,61,61,61,61,61,61,61,11.320435921,10.147991543,11.154011154,10.803275832,11.835364777,13.875300187,13.314397302,12.385568121,14.143245694,13.51594882,15.713440906,11.670190275,10.982410982,14.113957135,15.721603957,16.72151561,16.509852654,15.257583917,11.604714415,14.957650027,-4.393004984,-1.522198732,0.1716001716,-3.310681303,-3.88623918,-2.846215423,-3.195455352,-2.872015796,2.5385312783,-1.441701207,0.1689617302,0,0,0,0,0.1778884639,0.1775252974,0.1795009873,0.1813236627,0,6.7584692067,-3.044397463,-25.22522523,-2.439449381,-18.01801802,10.495419372,-0.710101189,-15.79608688,-4.170444243,15.137862678,6.9274309369,-3.044397463,-25.22522523,-2.439449381,-18.01801802,10.673307836,-0.532575892,-15.61658589,-3.98912058,15.137862678 +050,3,7,40,031,Oklahoma,Comanche County,124098,124093,125401,126115,126428,124648,124622,123689,121554,121994,121001,121224,121099,1308,714,313,-1780,-26,-933,-2135,440,-993,223,-125,488,2140,1973,1992,1873,1914,1785,1734,1725,1661,1643,180,936,967,1000,999,1021,1093,1070,1061,1118,1189,308,1204,1006,992,874,893,692,664,664,543,454,166,406,898,462,303,503,210,110,49,57,67,762,-897,-1618,-3322,-1201,-2358,-3052,-327,-1709,-382,-650,928,-491,-720,-2860,-898,-1855,-2842,-217,-1660,-325,-583,72,1,27,88,-2,29,15,-7,3,5,4,10343,10360,10357,10153,9907,10020,9821,9960,10305,10387,10276,10280,17.016810064,15.625061871,15.867705396,15.027881414,15.41615152,14.556990414,14.239492831,14.197823,13.714521622,13.560413168,7.4428664578,7.6581017886,7.9657155602,8.0154049825,8.2235583603,8.9136081356,8.7867689326,8.732689973,9.2310867995,9.8133482996,9.573943606,7.966960082,7.9019898357,7.0124764312,7.1925931594,5.643382278,5.4527238984,5.4651330274,4.483434823,3.747064868,3.2284228439,7.1116601925,3.6801605888,2.4310988085,4.0513710629,1.7125871075,0.903312694,0.4033004794,0.4706368046,0.5529809387,-7.132747022,-12.81365946,-26.46210709,-9.636137522,-18.99231206,-24.8895993,-2.685302281,-14.06613305,-3.15409227,-5.36474045,-3.904324178,-5.701999263,-22.7819465,-7.205038713,-14.940941,-23.17701219,-1.781989587,-13.66283257,-2.683455465,-4.811759511 +050,3,7,40,033,Oklahoma,Cotton County,6193,6186,6167,6179,6158,6164,6133,6008,5924,5866,5798,5650,5676,-19,12,-21,6,-31,-125,-84,-58,-68,-148,26,13,71,79,72,75,66,46,75,63,57,51,34,67,86,65,80,90,81,80,79,70,98,-21,4,-7,7,-5,-24,-35,-5,-16,-13,-47,0,3,5,0,-1,0,0,0,0,0,0,3,4,-17,-1,-24,-103,-49,-53,-53,-134,75,3,7,-12,-1,-25,-103,-49,-53,-53,-134,75,-1,1,-2,0,-1,2,0,0,1,-1,-2,48,48,48,48,48,48,48,48,48,48,48,48,11.501700956,12.807003323,11.686414543,12.198097097,10.87225105,7.7103586993,12.72264631,10.802469136,9.9580712788,9.0058273,10.853717803,13.941801086,10.550235351,13.01130357,14.825796887,13.57693597,13.570822731,13.545953361,12.229210342,17.305315204,0.6479831524,-1.134797763,1.1361791917,-0.813206473,-3.953545836,-5.866577271,-0.848176421,-2.743484225,-2.271139064,-8.299487904,0.4859873643,0.8105698306,0,-0.162641295,0,0,0,0,0,0,0.6479831524,-2.755937424,-0.162311313,-3.903391071,-16.96730088,-8.21320818,-8.990670059,-9.087791495,-23.41020266,13.243863676,1.1339705168,-1.945367593,-0.162311313,-4.066032366,-16.96730088,-8.21320818,-8.990670059,-9.087791495,-23.41020266,13.243863676 +050,3,7,40,035,Oklahoma,Craig County,15029,15023,15057,14983,14762,14696,14634,14706,14467,14328,14273,14110,14194,34,-74,-221,-66,-62,72,-239,-139,-55,-163,84,47,175,161,160,181,161,161,141,131,146,141,38,226,213,204,179,213,217,218,221,208,231,9,-51,-52,-44,2,-52,-56,-77,-90,-62,-90,1,4,4,5,5,4,5,1,2,1,0,27,-26,-180,-25,-68,119,-188,-63,33,-101,175,28,-22,-176,-20,-63,123,-183,-62,35,-100,175,-3,-1,7,-2,-1,1,0,0,0,-1,-1,1050,1050,1050,1050,1050,1050,1050,1050,1050,1050,1050,1050,11.651131824,10.825348798,10.862923484,12.342311626,10.974778459,11.037603263,9.793366904,9.160518863,10.28784836,9.9632560769,15.046604527,14.321734745,13.850227442,12.205932492,14.519427403,14.876769616,15.141517625,15.454005105,14.656660677,16.322781232,-3.395472703,-3.496385947,-2.987303958,0.136379134,-3.544648943,-3.839166352,-5.348150721,-6.293486242,-4.368812317,-6.359525155,0.2663115846,0.2689527652,0.3394663589,0.340947835,0.2726653033,0.34278271,0.0694565029,0.1398552498,0.0704647148,0,-1.7310253,-12.10287443,-1.697331794,-4.636890556,8.1117927744,-12.8886299,-4.375759681,2.307611622,-7.116936194,12.365743358,-1.464713715,-11.83392167,-1.357865436,-4.295942721,8.3844580777,-12.54584719,-4.306303178,2.4474668718,-7.046471479,12.365743358 +050,3,7,40,037,Oklahoma,Creek County,69967,69985,70243,70649,70761,70576,70559,70798,71161,71822,71693,71362,71485,258,406,112,-185,-17,239,363,661,-129,-331,123,220,884,839,862,868,878,876,858,823,769,776,156,779,799,841,830,898,878,897,836,920,985,64,105,40,21,38,-20,-2,-39,-13,-151,-209,1,23,37,37,54,87,47,27,26,19,19,185,281,51,-238,-101,181,324,675,-141,-199,312,186,304,88,-201,-47,268,371,702,-115,-180,331,8,-3,-16,-5,-8,-9,-6,-2,-1,0,1,1062,1062,1062,1062,1062,1062,1062,1062,1061,1061,1061,1061,12.5486188,11.866204653,12.197796755,12.300279874,12.422448128,12.341591586,12.001426743,11.469184406,10.751109713,10.864771399,11.058115436,11.3004738,11.900634653,11.761788359,12.705419611,12.369768736,12.54694614,11.650350138,12.862185873,13.79097916,1.4905033643,0.5657308535,0.2971621019,0.5384915152,-0.282971484,-0.02817715,-0.545519397,-0.181165732,-2.11107616,-2.926207761,0.3264912131,0.5233010395,0.5235713224,0.7652247848,1.2309259534,0.6621630189,0.3776672751,0.3623314636,0.2656320995,0.2660188873,3.9888709082,0.7213068383,-3.367837155,-1.431253764,2.5608919261,4.5646982579,9.4416818783,-1.964951399,-2.782146727,4.36831015,4.3153621213,1.2446078778,-2.844265833,-0.666028979,3.7918178796,5.2268612768,9.8193491534,-1.602619935,-2.516514627,4.6343290374 +050,3,7,40,039,Oklahoma,Custer County,27469,27542,27583,27800,28593,29318,29517,29568,29224,28928,28930,28913,28648,41,217,793,725,199,51,-344,-296,2,-17,-265,103,452,472,457,490,442,440,429,403,388,394,56,301,268,291,287,327,297,295,319,289,289,47,151,204,166,203,115,143,134,84,99,105,8,39,35,26,67,84,103,27,24,12,8,-11,28,536,521,-68,-147,-593,-459,-107,-129,-377,-3,67,571,547,-1,-63,-490,-432,-83,-117,-369,-3,-1,18,12,-3,-1,3,2,1,1,-1,1516,1516,1516,1516,1516,1517,1518,1518,1521,1524,1524,1525,16.322698301,16.739666271,15.782839184,16.656751933,14.96149615,14.96802286,14.754436649,13.930657817,13.415625054,13.689824708,10.869761479,9.5047257638,10.049904163,9.756097561,11.068799188,10.103415431,10.145824735,11.026997131,9.9925660841,10.041521169,5.4529368218,7.2349405068,5.732935021,6.9006543724,3.892696962,4.8646074296,4.6086119136,2.9036606865,3.42305897,3.6483035389,1.4083744109,1.2412888124,0.8979295816,2.2775558766,2.8433612592,3.5038780787,0.928600908,0.829617339,0.4149162388,0.2779659839,1.0111406027,19.009451528,17.993127385,-2.311549248,-4.975882204,-20.17281263,-15.78621544,-3.698710636,-4.460349567,-13.09914699,2.4195150136,20.25074034,18.891056967,-0.033993371,-2.132520944,-16.66893455,-14.85761453,-2.869093297,-4.045433328,-12.82118101 +050,3,7,40,041,Oklahoma,Delaware County,41487,41500,41564,41664,41733,41717,41792,41738,41967,42692,42897,43011,43136,64,100,69,-16,75,-54,229,725,205,114,125,112,401,425,440,396,416,410,467,450,401,410,135,501,537,555,499,569,540,561,602,615,635,-23,-100,-112,-115,-103,-153,-130,-94,-152,-214,-225,6,41,17,17,14,11,7,1,1,-2,0,80,163,167,86,171,91,354,814,357,330,351,86,204,184,103,185,102,361,815,358,328,351,1,-4,-3,-4,-7,-3,-2,4,-1,0,-1,356,356,356,356,356,356,356,356,356,356,356,356,9.6361801317,10.192213149,10.545236669,9.4840077117,9.960493236,9.7963084642,11.032495068,10.515369966,9.3355682823,9.5186135327,12.039217571,12.878161085,13.301378071,11.950807697,13.623847719,12.90245505,13.253168594,14.067228265,14.317642129,14.74224291,-2.403037439,-2.685947936,-2.756141402,-2.466799986,-3.663354483,-3.106146586,-2.220673526,-3.5518583,-4.982073846,-5.223629378,0.9852453501,0.407688526,0.4074295986,0.3352932019,0.2633784269,0.167254047,0.0236241864,0.0233674888,-0.046561438,0,3.9169510261,4.0049402257,2.0611144398,4.0953669664,2.1788578954,8.4582760886,19.230087764,8.3421935062,7.6826372398,8.1488618292,4.9021963762,4.4126287516,2.4685440383,4.4306601684,2.4422363223,8.6255301356,19.25371195,8.365560995,7.636075802,8.1488618292 +050,3,7,40,043,Oklahoma,Dewey County,4810,4810,4809,4785,4815,4855,4965,4986,4895,4891,4930,4896,4815,-1,-24,30,40,110,21,-91,-4,39,-34,-81,15,54,65,62,69,55,66,56,68,52,55,23,65,68,66,67,76,74,65,68,60,79,-8,-11,-3,-4,2,-21,-8,-9,0,-8,-24,0,2,1,5,11,14,14,15,12,10,6,8,-15,32,40,97,28,-98,-9,28,-35,-63,8,-13,33,45,108,42,-84,6,40,-25,-57,-1,0,0,-1,0,0,1,-1,-1,-1,0,93,93,93,93,93,93,93,93,93,93,93,93,11.257035647,13.541666667,12.823164426,14.052953157,11.054165411,13.358971764,11.444921316,13.847876998,10.584164462,11.327360725,13.550135501,14.166666667,13.650465357,13.645621181,15.274846749,14.978241069,13.284283671,13.847876998,12.212497456,16.270209041,-2.293099854,-0.625,-0.827300931,0.4073319756,-4.220681339,-1.619269305,-1.839362354,0,-1.628332994,-4.942848316,0.4169272462,0.2083333333,1.0341261634,2.2403258656,2.813787559,2.8337212833,3.065603924,2.4437429997,2.0354162426,1.2357120791,-3.126954346,6.6666666667,8.2730093071,19.755600815,5.6275751181,-19.83604898,-1.839362354,5.7020669993,-7.123956849,-12.97497683,-2.7100271,6.875,9.3071354705,21.99592668,8.4413626771,-17.0023277,1.2262415696,8.145809999,-5.088540607,-11.73926475 +050,3,7,40,045,Oklahoma,Ellis County,4151,4151,4158,4041,4080,4133,4117,4218,4083,3961,3942,3865,3830,7,-117,39,53,-16,101,-135,-122,-19,-77,-35,11,38,40,44,42,41,54,43,43,48,47,7,60,50,45,63,65,53,60,69,48,50,4,-22,-10,-1,-21,-24,1,-17,-26,0,-3,2,1,2,4,4,10,2,5,6,5,3,0,-96,48,48,0,115,-139,-111,3,-82,-36,2,-95,50,52,4,125,-137,-106,9,-77,-33,1,0,-1,2,1,0,1,1,-2,0,1,46,46,46,46,46,46,46,46,46,46,46,46,9.2694231004,9.851003571,10.714720565,10.181818182,9.8380323935,13.010480665,10.691198409,10.881943566,12.296656846,12.215724496,14.635931211,12.313754464,10.958236941,15.272727273,15.596880624,12.769545838,14.917951268,17.461723396,12.296656846,12.995451592,-5.366508111,-2.462750893,-0.243516376,-5.090909091,-5.75884823,0.2409348271,-4.226752859,-6.57977983,0,-0.779727096,0.2439321869,0.4925501785,0.9740655059,0.9696969697,2.399520096,0.4818696543,1.2431626057,1.5184107301,1.2809017548,0.7797270955,-23.41748994,11.821204285,11.688786071,0,27.594481104,-33.48994097,-27.59820985,0.7592053651,-21.00678878,-9.356725146,-23.17355775,12.313754464,12.662851577,0.9696969697,29.9940012,-33.00807132,-26.35504724,2.2776160952,-19.72588702,-8.576998051 +050,3,7,40,047,Oklahoma,Garfield County,60580,60582,60771,60768,61365,62368,62801,63246,62585,61720,61270,61332,60869,189,-3,597,1003,433,445,-661,-865,-450,62,-463,246,933,919,946,995,1031,974,908,888,829,818,146,709,641,716,697,688,711,730,694,630,676,100,224,278,230,298,343,263,178,194,199,142,53,288,265,157,121,136,281,219,224,175,142,41,-517,68,611,22,-26,-1207,-1265,-871,-312,-744,94,-229,333,768,143,110,-926,-1046,-647,-137,-602,-5,2,-14,5,-8,-8,2,3,3,0,-3,1830,1829,1816,1773,1800,1806,1793,1816,1774,1733,1801,1801,15.353096537,15.049167711,15.290989469,15.898505221,16.358977207,15.481081768,14.609227304,14.44019839,13.523433549,13.387779151,11.667036918,10.496753539,11.57330704,11.136942853,10.916562869,11.300871804,11.74530389,11.285470363,10.277156979,11.063739249,3.6860596187,4.5524141714,3.7176824291,4.7615623677,5.4424143375,4.1802099642,2.8639234142,3.1547280267,3.2462765697,2.3240399015,4.7392195098,4.3395314944,2.5377223538,1.933386062,2.1579252184,4.4663079845,3.5235911669,3.6425725669,2.8547658276,2.3240399015,-8.507557245,1.113540157,9.8761041921,0.3515247386,-0.412544527,-19.1844617,-20.35316359,-14.16375315,-5.089639647,-12.17665977,-3.768337735,5.4530716514,12.413826546,2.2849108006,1.7453806913,-14.71815371,-16.82957242,-10.52118058,-2.234873819,-9.852619864 +050,3,7,40,049,Oklahoma,Garvin County,27576,27571,27576,27463,27342,27426,27613,27913,27944,27875,27747,27687,27691,5,-113,-121,84,187,300,31,-69,-128,-60,4,111,342,376,372,366,407,368,347,356,313,327,88,428,404,379,361,343,333,346,386,369,360,23,-86,-28,-7,5,64,35,1,-30,-56,-33,5,9,28,38,40,55,55,47,39,31,25,-20,-34,-122,53,144,183,-57,-116,-137,-36,13,-15,-25,-94,91,184,238,-2,-69,-98,-5,38,-3,-2,1,0,-2,-2,-2,-1,0,1,-1,317,317,317,317,317,317,317,317,317,317,317,317,12.427551373,13.721375787,13.584574934,13.299660241,14.659799013,13.176504288,12.433042512,12.800690374,11.292708446,11.809743942,15.552608151,14.743180367,13.840198656,13.117970893,12.354572633,11.923304152,12.397212419,13.879400237,13.313129127,13.001552963,-3.125056778,-1.02180458,-0.255623722,0.1816893476,2.3052263804,1.2532001361,0.0358300937,-1.078709863,-2.02042068,-1.191809022,0.3270408256,1.0218045799,1.3876716331,1.4535147804,1.9810539207,1.9693144995,1.6840144037,1.4023228219,1.1184471624,0.9028856224,-1.235487563,-4.452148527,1.9354367514,5.2326532095,6.5915066816,-2.040925936,-4.156290869,-4.926108374,-1.298841866,0.4695005237,-0.908446738,-3.430343947,3.3231083845,6.68616799,8.5725606022,-0.071611436,-2.472276465,-3.523785552,-0.180394704,1.3723861461 +050,3,7,40,051,Oklahoma,Grady County,52431,52423,52434,52746,53025,53638,53883,54563,54677,54819,55411,55764,55906,11,312,279,613,245,680,114,142,592,353,142,146,612,596,634,584,621,600,612,556,574,550,155,529,538,530,563,516,544,566,576,546,581,-9,83,58,104,21,105,56,46,-20,28,-31,9,53,53,70,47,36,26,23,19,16,12,17,178,178,435,187,539,36,77,595,310,158,26,231,231,505,234,575,62,100,614,326,170,-6,-2,-10,4,-10,0,-4,-4,-2,-1,3,1082,1082,1082,1082,1081,1081,1079,1076,1074,1074,1075,1075,11.637193383,11.269629672,11.887908647,10.862994206,11.452704572,10.984987184,11.178490538,10.087997823,10.326062514,9.8504522253,10.058946568,10.172920744,9.9378416133,10.472372839,9.5162569389,9.9597217137,10.338277197,10.450875442,9.8223521475,10.405659533,1.578246815,1.0967089278,1.9500670336,0.390621367,1.9364476329,1.0252654705,0.8402133411,-0.36287762,0.5037103665,-0.555207307,1.007796159,1.0021650547,1.3125451187,0.8742478214,0.6639249027,0.4760161113,0.4201066706,0.3447337385,0.2878344952,0.2149189576,3.3846738924,3.3657618818,8.1565303807,3.4783902679,9.9404311823,0.6590992311,1.406444071,10.795609181,5.5767933438,2.8297662756,4.3924700513,4.3679269365,9.4690754995,4.3526380893,10.604356085,1.1351153424,1.8265507416,11.140342919,5.864627839,3.0446852333 +050,3,7,40,053,Oklahoma,Grant County,4527,4532,4536,4562,4532,4517,4469,4497,4454,4376,4315,4328,4372,4,26,-30,-15,-48,28,-43,-78,-61,13,44,10,53,48,58,48,62,55,43,52,51,51,24,62,56,78,62,57,60,64,63,46,47,-14,-9,-8,-20,-14,5,-5,-21,-11,5,4,0,1,0,0,0,0,0,0,1,1,0,18,34,-23,6,-36,24,-38,-56,-51,7,40,18,35,-23,6,-36,24,-38,-56,-50,8,40,0,0,1,-1,2,-1,0,-1,0,0,0,73,73,73,73,73,73,73,73,73,73,73,73,11.650912288,10.55641082,12.819096033,10.68328511,13.830024537,12.289129706,9.7395243488,11.966402025,11.801457827,11.724137931,13.629369092,12.315812624,17.239473975,13.799243267,12.714699978,13.406323316,14.49603624,14.4977563,10.644452158,10.804597701,-1.978456804,-1.759401803,-4.420377942,-3.115958157,1.1153245594,-1.11719361,-4.756511891,-2.531354275,1.1570056693,0.9195402299,0.2198285337,0,0,0,0,0,0,0.2301231159,0.2314011339,0,7.4741701473,-5.058280185,1.3261133827,-8.012463833,5.3535578853,-8.490671433,-12.68403171,-11.73627891,1.6198079371,9.1954022989,7.693998681,-5.058280185,1.3261133827,-8.012463833,5.3535578853,-8.490671433,-12.68403171,-11.50615579,1.8512090709,9.1954022989 +050,3,7,40,055,Oklahoma,Greer County,6239,6239,6211,6144,6054,6139,6121,6031,5958,5794,5797,5698,5704,-28,-67,-90,85,-18,-90,-73,-164,3,-99,6,23,57,53,80,79,71,71,59,46,47,49,31,76,78,81,75,89,66,83,81,53,60,-8,-19,-25,-1,4,-18,5,-24,-35,-6,-11,0,-2,-2,0,-1,-2,-2,-1,-2,-2,-1,-20,-46,-66,85,-19,-71,-76,-139,40,-90,18,-20,-48,-68,85,-20,-73,-78,-140,38,-92,17,0,0,3,1,-2,1,0,0,0,-1,0,1146,1146,1146,1146,1146,1145,1142,1137,1135,1135,1136,1136,9.2270335896,8.689949172,13.122283277,12.887438825,11.685319289,11.844190508,10.040844112,7.9371926495,8.1774684645,8.5949833363,12.302711453,12.7889818,13.286311818,12.234910277,14.647794602,11.010092585,14.125255276,13.97636097,9.221400609,10.524469391,-3.075677863,-4.099032628,-0.164028541,0.6525285481,-2.962475313,0.8340979231,-4.084411164,-6.03916832,-1.043932144,-1.929486055,-0.323755565,-0.32792261,0,-0.163132137,-0.329163924,-0.333639169,-0.170183799,-0.345095333,-0.347977381,-0.175407823,-7.446377985,-10.82144614,13.942425982,-3.099510604,-11.68531929,-12.67828843,-23.65554799,6.9019066517,-15.65898217,3.1573408174,-7.770133549,-11.14936875,13.942425982,-3.262642741,-12.01448321,-13.0119276,-23.82573179,6.5568113191,-16.00695955,2.9819329942 +050,3,7,40,057,Oklahoma,Harmon County,2922,2922,2922,2936,2916,2894,2804,2782,2712,2715,2688,2645,2557,0,14,-20,-22,-90,-22,-70,3,-27,-43,-88,12,41,38,43,35,30,29,33,38,23,25,23,30,19,36,40,22,32,28,44,28,31,-11,11,19,7,-5,8,-3,5,-6,-5,-6,0,3,5,6,4,7,5,2,2,2,2,10,2,-46,-36,-91,-37,-72,-4,-23,-39,-84,10,5,-41,-30,-87,-30,-67,-2,-21,-37,-82,1,-2,2,1,2,0,0,0,0,-1,0,100,100,100,100,100,100,100,100,100,100,100,100,13.997951519,12.987012987,14.802065404,12.285012285,10.741138561,10.556971241,12.161415146,14.066259485,8.6255390962,9.6116878124,10.242403551,6.4935064935,12.39242685,14.04001404,7.8768349445,11.649071715,10.318776488,16.287247825,10.500656291,11.918492887,3.7555479686,6.4935064935,2.4096385542,-1.755001755,2.8643036162,-1.092100473,1.8426386586,-2.22098834,-1.875117195,-2.306805075,1.0242403551,1.7088174983,2.065404475,1.404001404,2.5062656642,1.8201674554,0.7370554634,0.7403294466,0.7500468779,0.768935025,0.6828269034,-15.72112098,-12.39242685,-31.94103194,-13.24740422,-26.21041136,-1.474110927,-8.513788636,-14.62591412,-32.29527105,1.7070672584,-14.01230349,-10.32702238,-30.53703054,-10.74113856,-24.3902439,-0.737055463,-7.773459189,-13.87586724,-31.52633602 +050,3,7,40,059,Oklahoma,Harper County,3685,3682,3695,3713,3711,3869,3894,3825,3787,3799,3746,3707,3611,13,18,-2,158,25,-69,-38,12,-53,-39,-96,19,44,45,59,66,56,46,41,42,39,36,2,36,49,46,42,38,45,34,41,58,77,17,8,-4,13,24,18,1,7,1,-19,-41,1,18,27,29,45,28,49,25,23,19,14,-4,-8,-25,115,-45,-117,-89,-20,-76,-39,-69,-3,10,2,144,0,-89,-40,5,-53,-20,-55,-1,0,0,1,1,2,1,0,-1,0,0,41,41,41,41,41,41,41,41,41,41,41,41,11.879049676,12.122844828,15.567282322,17.003735669,14.509651509,12.086179716,10.809385711,11.133200795,10.465584328,9.8387537579,9.7192224622,13.200431034,12.137203166,10.820559062,9.8458349527,11.823436679,8.9638808331,10.868124586,15.564202335,21.044001093,2.1598272138,-1.077586207,3.4300791557,6.183176607,4.6638165565,0.2627430373,1.8455048774,0.2650762094,-5.098618006,-11.20524734,4.8596112311,7.2737068966,7.6517150396,11.593456138,7.2548257546,12.874408828,6.5910888479,6.0967528164,5.0986180062,3.8261820169,-2.159827214,-6.734913793,30.343007916,-11.59345614,-30.31480762,-23.38413032,-5.272871078,-20.14579192,-10.46558433,-18.85761137,2.6997840173,0.5387931034,37.994722955,0,-23.05998186,-10.50972149,1.3182177696,-14.0490391,-5.366966322,-15.03142935 +050,3,7,40,061,Oklahoma,Haskell County,12769,12775,12779,12759,12819,12916,12828,12749,12706,12735,12675,12670,12652,4,-20,60,97,-88,-79,-43,29,-60,-5,-18,39,151,163,159,179,167,156,126,133,115,119,23,173,127,180,165,142,154,202,174,136,144,16,-22,36,-21,14,25,2,-76,-41,-21,-25,6,15,7,10,10,6,18,8,8,7,6,-17,-13,20,109,-113,-112,-60,96,-25,9,0,-11,2,27,119,-103,-106,-42,104,-17,16,6,-1,0,-3,-1,1,2,-3,1,-2,0,1,78,78,78,78,78,78,78,78,78,78,78,78,11.825514919,12.745328016,12.356712648,13.90615289,13.058607343,12.256923984,9.9052710192,10.468319559,9.0747681989,9.3989416318,13.548437622,9.9304089452,13.9887313,12.81852082,11.103726004,12.099783932,15.879878936,13.695395514,10.731899783,11.373509201,-1.722922703,2.8149190711,-1.632018652,1.0876320696,1.9548813387,0.1571400511,-5.974607916,-3.227075954,-1.657131584,-1.97456757,1.1747200251,0.5473453749,0.7771517389,0.7768800497,0.4691715213,1.4142604596,0.6289060965,0.6296733569,0.5523771947,0.4738962167,-1.018090688,1.5638439284,8.4709539538,-8.778744562,-8.757868397,-4.714201532,7.5468731575,-1.96772924,0.7101992503,0,0.1566293367,2.1111893033,9.2481056926,-8.001864512,-8.288696876,-3.299941072,8.175779254,-1.338055884,1.2625764451,0.4738962167 +050,3,7,40,063,Oklahoma,Hughes County,14003,13999,14027,13751,13658,13638,13680,13589,13417,13266,13277,13240,13126,28,-276,-93,-20,42,-91,-172,-151,11,-37,-114,35,144,152,140,133,157,162,158,164,152,151,30,170,189,235,171,206,200,211,192,172,176,5,-26,-37,-95,-38,-49,-38,-53,-28,-20,-25,-1,2,6,2,6,4,6,4,4,1,1,23,-252,-61,75,75,-45,-141,-102,38,-18,-89,22,-250,-55,77,81,-41,-135,-98,42,-17,-88,1,0,-1,-2,-1,-1,1,0,-3,0,-1,1565,1565,1565,1565,1564,1562,1559,1556,1556,1556,1555,1556,10.367917057,11.0912474,10.257913247,9.7371696317,11.514907037,11.997333926,11.842746318,12.357307011,11.464343629,11.45414549,12.239902081,13.791090518,17.218640094,12.519218098,15.108731527,14.811523365,15.815313121,14.467091135,12.972809896,13.350527194,-1.871985024,-2.699843117,-6.960726846,-2.782048466,-3.593824489,-2.814189439,-3.972566803,-2.109784124,-1.508466267,-1.896381704,0.143998848,0.4378123974,0.1465416178,0.4392708105,0.2933734277,0.444345701,0.2998163625,0.301397732,0.0754233133,0.0758552681,-18.14385485,-4.451092707,5.4953106682,5.4908851307,-3.300451062,-10.44212397,-7.645317243,2.8632784538,-1.35761964,-6.751118865,-17.999856,-4.013280309,5.641852286,5.9301559411,-3.007077634,-9.997778271,-7.345500881,3.1646761858,-1.282196327,-6.675263597 +050,3,7,40,065,Oklahoma,Jackson County,26446,26446,26485,26422,26226,26141,25834,25464,25488,25121,24695,24431,24305,39,-63,-196,-85,-307,-370,24,-367,-426,-264,-126,102,429,467,447,410,406,442,370,375,379,358,44,258,273,274,258,274,265,260,269,224,222,58,171,194,173,152,132,177,110,106,155,136,25,43,119,70,97,128,90,28,7,17,19,-44,-278,-524,-332,-568,-636,-245,-506,-538,-434,-281,-19,-235,-405,-262,-471,-508,-155,-478,-531,-417,-262,0,1,15,4,12,6,2,1,-1,-2,0,687,687,689,687,716,696,684,692,692,692,688,687,16.217135729,17.740464975,17.071820039,15.776815777,15.829077157,17.349662427,14.621905195,15.055403886,15.429711354,14.691398555,9.752962746,10.370764322,10.464605572,9.9278499278,10.682677687,10.40194693,10.274852299,10.799743054,9.1194072385,9.1103086014,6.4641729828,7.3697006534,6.6072144671,5.848965849,5.1463994698,6.9477154969,4.3470528957,4.2556608319,6.3103041159,5.581089954,1.625493791,4.5205895761,2.6734393798,3.7325637326,4.9904479707,3.5327366934,1.1065225553,0.2810342059,0.6920978708,0.7797110965,-10.50900637,-19.90578939,-12.67974106,-21.85666186,-24.79628835,-9.616894332,-19.99644332,-21.59948611,-17.66885152,-11.53151674,-8.883512579,-15.38519982,-10.00630168,-18.12409812,-19.80584038,-6.084157639,-18.88992077,-21.3184519,-16.97675365,-10.75180565 +050,3,7,40,067,Oklahoma,Jefferson County,6472,6472,6436,6449,6336,6354,6288,6259,6239,6158,6088,5988,5949,-36,13,-113,18,-66,-29,-20,-81,-70,-100,-39,12,71,82,82,72,78,62,79,55,65,59,24,105,99,99,107,91,86,102,97,77,85,-12,-34,-17,-17,-35,-13,-24,-23,-42,-12,-26,0,1,2,1,3,2,0,0,0,0,0,-23,45,-100,35,-37,-17,4,-57,-28,-88,-13,-23,46,-98,36,-34,-15,4,-57,-28,-88,-13,-1,1,2,-1,3,-1,0,-1,0,0,0,144,144,144,144,144,144,144,144,144,144,144,144,11.02056655,12.827532264,12.92356186,11.390602753,12.433250976,9.921587454,12.745018956,8.9825249061,10.765154025,9.885230795,16.298020955,15.486898709,15.602836879,16.927701313,14.505459472,13.762201952,16.455594095,15.841907562,12.752567075,14.241434196,-5.277454404,-2.659366445,-2.67927502,-5.53709856,-2.072208496,-3.840614498,-3.710575139,-6.859382656,-1.987413051,-4.356203401,0.1552192472,0.3128666406,0.1576044129,0.474608448,0.3188013071,0,0,0,0,0,6.9848661234,-15.64333203,5.5161544523,-5.853504192,-2.70981111,0.6401024164,-9.195773171,-4.57292177,-14.57436237,-2.178101701,7.1400853706,-15.33046539,5.6737588652,-5.378895744,-2.391009803,0.6401024164,-9.195773171,-4.57292177,-14.57436237,-2.178101701 +050,3,7,40,069,Oklahoma,Johnston County,10957,10957,11003,11075,10972,10997,11110,10977,11125,11133,11003,11055,10824,46,72,-103,25,113,-133,148,8,-130,52,-231,36,111,134,130,157,124,108,127,150,125,125,26,152,138,115,135,132,125,143,166,150,185,10,-41,-4,15,22,-8,-17,-16,-16,-25,-60,2,12,5,4,-1,2,3,2,1,1,1,32,102,-106,7,90,-126,165,21,-114,76,-170,34,114,-101,11,89,-124,168,23,-113,77,-169,2,-1,2,-1,2,-1,-3,1,-1,0,-2,292,292,292,292,292,292,292,292,292,292,292,292,10.055258628,12.155848868,11.834858209,14.203645904,11.228324354,9.7728712334,11.41162728,13.552584026,11.33375646,11.426482015,13.769363167,12.518710029,10.469297647,12.213326096,11.952732377,11.311193557,12.849312607,14.998192989,13.600507752,16.911193382,-3.714104538,-0.36286116,1.3655605626,1.9903198082,-0.724408023,-1.538322324,-1.437685327,-1.445608963,-2.266751292,-5.484711367,1.0870549869,0.4535764503,0.3641494834,-0.090469082,0.1811020057,0.2714686454,0.1797106658,0.0903505602,0.0906700517,0.0914118561,9.2399673884,-9.615820747,0.6372615959,8.1422173972,-11.40942636,14.930775495,1.8869619912,-10.29996386,6.8909239278,-15.54001554,10.327022375,-9.162244296,1.0014110792,8.051748315,-11.22832435,15.202244141,2.066672657,-10.2096133,6.9815939795,-15.44860368 +050,3,7,40,071,Oklahoma,Kay County,46562,46562,46428,45851,45692,45554,45475,45261,44937,44445,44047,43668,43274,-134,-577,-159,-138,-79,-214,-324,-492,-398,-379,-394,153,623,646,636,636,595,625,611,568,509,517,106,608,564,591,576,606,582,594,602,578,577,47,15,82,45,60,-11,43,17,-34,-69,-60,0,14,8,0,12,15,21,8,10,4,2,-192,-607,-247,-179,-142,-217,-387,-518,-374,-314,-335,-192,-593,-239,-179,-130,-202,-366,-510,-364,-310,-333,11,1,-2,-4,-9,-1,-1,1,0,0,-1,1273,1273,1273,1273,1273,1273,1273,1273,1273,1274,1275,1275,13.50253037,14.113585965,13.940337111,13.973568863,13.114970905,13.858400408,13.671656486,12.837318628,11.605768683,11.892986129,13.177429318,12.322078149,12.953992504,12.655307649,13.357432552,12.90494246,13.291266698,13.605749672,13.179045773,13.273216627,0.3251010522,1.791507816,0.9863446069,1.3182612135,-0.242461647,0.9534579481,0.3803897877,-0.768431045,-1.573277091,-1.380230498,0.3034276488,0.1747812503,0,0.2636522427,0.3306295186,0.4656422537,0.1790069589,0.2260091308,0.091204469,0.0460076833,-13.15575591,-5.396371104,-3.923459659,-3.119884872,-4.783107036,-8.581121533,-11.59070059,-8.452741491,-7.159550818,-7.70628695,-12.85232827,-5.221589854,-3.923459659,-2.856232629,-4.452477517,-8.115479279,-11.41169363,-8.22673236,-7.068346349,-7.660279267 +050,3,7,40,073,Oklahoma,Kingfisher County,15034,15036,15076,15171,15036,15309,15513,15595,15661,15773,15916,15899,15806,40,95,-135,273,204,82,66,112,143,-17,-93,54,196,179,202,217,229,194,184,182,187,186,20,154,153,140,162,155,146,169,156,144,142,34,42,26,62,55,74,48,15,26,43,44,-1,1,2,-4,11,11,79,54,38,30,28,9,52,-168,215,138,0,-61,43,81,-89,-166,8,53,-166,211,149,11,18,97,119,-59,-138,-2,0,5,0,0,-3,0,0,-2,-1,1,155,155,155,155,155,155,155,155,155,155,155,155,12.959962972,11.851557586,13.313560718,14.08085134,14.722900862,12.413616586,11.707068779,11.486635741,11.75546126,11.733165116,10.182828049,10.130102294,9.2272202999,10.511971968,9.9652822425,9.3422062964,10.752688172,9.8456877781,9.0523338048,8.9575776691,2.7771349225,1.7214552918,4.0863404185,3.5688793719,4.757618619,3.0714102892,0.954380607,1.640947963,2.7031274556,2.7755874468,0.0661222601,0.1324196378,-0.263634866,0.7137758744,0.7072135785,5.0550294343,3.4357701851,2.3983085613,1.885902876,1.7662829207,3.4383575231,-11.12324958,14.170374032,8.9546427876,0,-3.903250576,2.7358910734,5.1121840386,-5.594845199,-10.47153446,3.5044797831,-10.99082994,13.906739166,9.668418662,0.7072135785,1.1517788585,6.1716612585,7.5104926,-3.708942323,-8.705251538 +050,3,7,40,075,Oklahoma,Kiowa County,9446,9446,9442,9426,9359,9347,9286,9120,9034,8850,8728,8725,8741,-4,-16,-67,-12,-61,-166,-86,-184,-122,-3,16,24,99,129,120,122,116,121,99,116,119,110,15,141,133,157,128,154,139,140,139,120,108,9,-42,-4,-37,-6,-38,-18,-41,-23,-1,2,2,8,8,2,2,2,1,1,1,1,1,-14,17,-72,25,-55,-132,-69,-146,-100,-2,13,-12,25,-64,27,-53,-130,-68,-145,-99,-1,14,-1,1,1,-2,-2,2,0,2,0,-1,0,171,171,171,171,171,171,171,171,171,171,171,171,10.493958024,13.734362523,12.830107987,13.095046423,12.604585461,13.330395505,11.071348692,13.198316077,13.636624076,12.595900607,14.945940216,14.160234229,16.786057949,13.7390651,16.733673802,15.313429547,15.656452695,15.815223575,13.751217556,12.366884232,-4.451982192,-0.425871706,-3.955949963,-0.644018677,-4.129088341,-1.983034042,-4.585104004,-2.616907498,-0.11459348,0.2290163747,0.847996608,0.8517434123,0.2138351331,0.2146728922,0.217320439,0.1101685579,0.111831805,0.1137785869,0.1145934796,0.1145081873,1.801992792,-7.665690711,2.6729391639,-5.903504535,-14.34314897,-7.601630495,-16.32744352,-11.37785869,-0.229186959,1.4886064354,2.6499894,-6.813947298,2.886774297,-5.688831643,-14.12582853,-7.491461937,-16.21561172,-11.2640801,-0.11459348,1.6031146227 +050,3,7,40,077,Oklahoma,Latimer County,11154,11156,11158,11181,11009,10796,10779,10622,10553,10312,10155,10044,10132,2,23,-172,-213,-17,-157,-69,-241,-157,-111,88,34,150,122,102,114,126,141,115,115,139,121,13,119,122,112,138,149,160,168,153,132,121,21,31,0,-10,-24,-23,-19,-53,-38,7,0,0,0,2,5,3,10,2,2,3,3,2,-19,-7,-181,-211,5,-145,-52,-190,-123,-121,87,-19,-7,-179,-206,8,-135,-50,-188,-120,-118,89,0,-1,7,3,-1,1,0,0,1,0,-1,574,574,574,574,574,574,575,574,574,574,574,575,13.429428354,10.995944119,9.3556523733,10.56778679,11.775150694,13.317591499,11.023244668,11.237601993,13.763057577,11.99444885,10.654013161,10.995944119,10.272873194,12.792584009,13.924582963,15.112160567,16.103522646,14.950896565,13.069953958,11.99444885,2.7754151932,0,-0.917220821,-2.224797219,-2.14943227,-1.794569067,-5.080277977,-3.713294572,0.693103619,0,0,0.180261379,0.4586104105,0.2780996524,0.9345357694,0.1889020071,0.1917086029,0.2931548346,0.2970444081,0.1982553529,-0.626706657,-16.3136548,-19.35335932,0.4634994206,-13.55076866,-4.911452184,-18.21231728,-12.01934822,-11.98079113,8.6241078509,-0.626706657,-16.13339342,-18.89474891,0.741599073,-12.61623289,-4.722550177,-18.02060867,-11.72619338,-11.68374672,8.8223632038 +050,3,7,40,079,Oklahoma,Le Flore County,50384,50382,50527,50505,50346,50309,50225,50030,50154,50022,50080,49804,49935,145,-22,-159,-37,-84,-195,124,-132,58,-276,131,173,686,670,696,657,630,625,587,606,621,596,115,614,600,628,582,620,635,646,700,682,732,58,72,70,68,75,10,-10,-59,-94,-61,-136,9,39,58,59,83,65,46,40,34,29,25,80,-130,-290,-157,-239,-268,92,-112,122,-245,241,89,-91,-232,-98,-156,-203,138,-72,156,-216,266,-2,-3,3,-7,-3,-2,-4,-1,-4,1,1,1616,1616,1616,1616,1615,1615,1614,1614,1612,1612,1612,1612,13.579855887,13.286928241,13.829417317,13.070205105,12.567951723,12.477042242,11.719373902,12.107650197,12.434423932,11.951192613,12.15456489,11.898741708,12.478267349,11.578172559,12.368460426,12.676674918,12.897300751,13.985734551,13.655840775,14.67831039,1.4252909969,1.3881865326,1.3511499677,1.4920325462,0.1994912972,-0.199632676,-1.177926849,-1.878084354,-1.221416844,-2.727117777,0.7720326233,1.1502116984,1.1723212955,1.6511826845,1.2966934317,0.918310309,0.7985944737,0.6793071068,0.5806735814,0.501308415,-2.573442078,-5.751058492,-3.119566837,-4.754610381,-5.346366765,1.8366206181,-2.236064526,2.437513736,-4.905690601,4.8326131202,-1.801409454,-4.600846794,-1.947245542,-3.103427696,-4.049673333,2.7549309271,-1.437470053,3.1168208427,-4.32501702,5.3339215352 +050,3,7,40,081,Oklahoma,Lincoln County,34273,34274,34355,34263,34169,34247,34539,34937,34907,34967,34824,34939,35045,81,-92,-94,78,292,398,-30,60,-143,115,106,99,374,386,399,395,428,429,360,357,365,358,51,375,382,372,406,360,411,424,413,370,382,48,-1,4,27,-11,68,18,-64,-56,-5,-24,1,0,2,1,4,8,3,5,6,3,2,34,-91,-99,56,299,324,-48,121,-92,118,129,35,-91,-97,57,303,332,-45,126,-86,121,131,-2,0,-1,-6,0,-2,-3,-2,-1,-1,-1,386,386,386,386,386,386,386,386,386,386,386,386,10.900929785,11.28127192,11.66393826,11.484895182,12.320801428,12.284519787,10.304261957,10.230545486,10.463999541,10.230909922,10.930076656,11.164367547,10.874649205,11.804727706,10.363290921,11.76908539,12.13613075,11.835336935,10.607342001,10.916780979,-0.029146871,0.1169043722,0.7892890552,-0.319832524,1.9575105072,0.5154343967,-1.831868792,-1.604791449,-0.143342459,-0.685871056,0,0.0584521861,0.029232928,0.116302736,0.2302953538,0.0859057328,0.1431147494,0.1719419409,0.0860054757,0.0571559214,-2.652365269,-2.893383213,1.6370439663,8.6936295176,9.3269618285,-1.374491724,3.4633769356,-2.636443094,3.3828820435,3.6865569273,-2.652365269,-2.834931026,1.6662768943,8.8099322537,9.5572571823,-1.288585992,3.606491685,-2.464501153,3.4688875192,3.7437128487 +050,3,7,40,083,Oklahoma,Logan County,41848,41843,42045,42568,43035,43828,44681,45355,46032,46806,47304,48084,48777,202,523,467,793,853,674,677,774,498,780,693,123,473,452,474,473,559,538,521,515,496,504,101,355,307,370,335,391,352,379,379,377,437,22,118,145,104,138,168,186,142,136,119,67,8,6,-7,6,11,20,17,13,14,2,7,163,398,332,674,690,485,474,618,351,658,622,171,404,325,680,701,505,491,631,365,660,629,9,1,-3,9,14,1,0,1,-3,1,-3,2161,2160,2163,2168,2174,2171,2176,2172,2162,2159,2162,2163,11.180315082,10.560377557,10.913737725,10.688178603,12.41725532,11.774103538,11.223852302,10.944639252,10.399630981,10.406665221,8.3911455686,7.1726458185,8.5191623591,7.5698516535,8.685414723,7.7035026864,8.1647601198,8.0544044204,7.9045582254,9.0232394875,2.789169513,3.3877317384,2.3945753658,3.1183269498,3.7318405971,4.0706008513,3.0590921821,2.8902348316,2.4950727555,1.3834257338,0.1418221786,-0.16354567,0.1381485788,0.2485622931,0.4442667377,0.3720441638,0.280057735,0.2975241738,0.0419339959,0.144537017,9.4075378488,7.7567374975,15.518690351,15.591634749,10.77346839,10.373466686,13.313513863,7.4593560727,13.796284648,12.843146364,9.5493600274,7.5931918274,15.65683893,15.840197042,11.217735128,10.745510849,13.593571598,7.7568802465,13.838218644,12.987683381 +050,3,7,40,085,Oklahoma,Love County,9423,9416,9411,9385,9572,9701,9740,9815,10034,10088,10109,10177,10230,-5,-26,187,129,39,75,219,54,21,68,53,26,141,127,146,112,105,138,109,121,125,121,47,113,88,116,116,113,110,119,134,123,139,-21,28,39,30,-4,-8,28,-10,-13,2,-18,2,10,7,3,3,11,23,17,13,9,7,14,-63,139,95,40,73,168,47,21,57,65,16,-53,146,98,43,84,191,64,34,66,72,0,-1,2,1,0,-1,0,0,0,0,-1,88,88,88,88,88,88,88,88,88,88,88,88,15.003192169,13.398744527,15.150728999,11.522041047,10.738941447,13.904982619,10.83391313,11.981977521,12.323770088,11.858675945,12.023834858,9.2841694361,12.037565506,11.933542513,11.55714651,11.083681798,11.827850114,13.26929742,12.126589766,13.622776498,2.9793573101,4.114575091,3.113163493,-0.411501466,-0.818205063,2.8213008212,-0.993936984,-1.287319899,0.1971803214,-1.764100554,1.0640561822,0.7385134779,0.3113163493,0.3086260995,1.1250319611,2.3174971031,1.6896928735,1.287319899,0.8873114463,0.6860391042,-6.703553948,14.664767632,9.8583510611,4.1150146597,7.4661211966,16.927804927,4.6715038267,2.0795167599,5.61963916,6.3703631107,-5.639497765,15.40328111,10.16966741,4.4236407592,8.5911531578,19.24530203,6.3611967001,3.3668366589,6.5069506063,7.0564022149 +050,3,7,40,087,Oklahoma,McClain County,34506,34507,34737,35199,35583,36459,37248,37981,38625,39310,39855,40466,41348,230,462,384,876,789,733,644,685,545,611,882,111,422,390,423,433,409,467,434,411,423,419,54,318,333,315,341,346,354,389,434,384,408,57,104,57,108,92,63,113,45,-23,39,11,2,24,18,13,13,14,11,9,6,2,5,162,335,306,739,671,651,519,633,563,573,872,164,359,324,752,684,665,530,642,569,575,877,9,-1,3,16,13,5,1,-2,-1,-3,-6,194,194,194,194,194,194,194,194,194,194,194,194,12.068176619,11.019750784,11.743149829,11.749223276,10.873466349,12.192256481,11.137486367,10.383376492,10.532737391,10.24274574,9.0940288264,9.4091718233,8.744898809,9.2528525106,9.1985803347,9.2420959194,9.9826778726,10.964441357,9.5616339438,9.9738431075,2.9741477923,1.6105789608,2.9982510202,2.4963707653,1.6748860147,2.9501605618,1.1548084943,-0.581064865,0.9711034474,0.2689026328,0.6863417982,0.5086038823,0.3609005858,0.3527480429,0.3721968922,0.2871837715,0.2309616989,0.1515821386,0.0498001768,0.1222284695,9.5801876001,8.6462659998,20.515810222,18.207225908,17.307155485,13.549852492,16.244306153,14.223457336,14.267750651,21.316645073,10.266529398,9.1548698822,20.876710808,18.559973951,17.679352377,13.837036263,16.475267851,14.375039475,14.317550827,21.438873542 +050,3,7,40,089,Oklahoma,McCurtain County,33151,33152,33204,33312,33350,33232,33192,33174,33099,33024,32921,32748,32772,52,108,38,-118,-40,-18,-75,-75,-103,-173,24,115,480,477,496,486,450,475,454,462,430,432,71,379,395,413,430,429,423,471,418,400,490,44,101,82,83,56,21,52,-17,44,30,-58,-1,7,4,4,29,68,97,71,86,73,45,11,2,-44,-205,-121,-104,-224,-126,-234,-275,35,10,9,-40,-201,-92,-36,-127,-55,-148,-202,80,-2,-2,-4,0,-4,-3,0,-3,1,-1,2,454,454,454,454,454,454,454,454,454,454,454,454,14.432617716,14.31100177,14.89892163,14.633265085,13.561160835,14.334646085,13.731984332,14.011676397,13.095981361,13.186813187,11.395754405,11.850829558,12.405755309,12.947127544,12.928306663,12.765379566,14.246177578,12.677231026,12.182308243,14.957264957,3.0368633111,2.4601722121,2.4931663212,1.6861375406,0.6328541723,1.5692665188,-0.514193246,1.3344453711,0.9136731182,-1.77045177,0.210475675,0.1200084006,0.1201525938,0.8731783693,2.0492420818,2.9272856216,2.1475129683,2.6082341345,2.2232712543,1.3736263736,0.0601359072,-1.320092406,-6.157820432,-3.643261472,-3.134134949,-6.759917312,-3.811079352,-7.09682311,-8.375336917,1.0683760684,0.2706115822,-1.200084006,-6.037667838,-2.770083102,-1.084892867,-3.83263169,-1.663566384,-4.488588976,-6.152065663,2.442002442 +050,3,7,40,091,Oklahoma,McIntosh County,20252,20245,20267,20264,20193,20107,19958,19811,19761,19693,19702,19595,19635,22,-3,-71,-86,-149,-147,-50,-68,9,-107,40,47,206,190,214,238,202,228,211,183,176,177,79,370,309,300,336,300,273,330,328,303,335,-32,-164,-119,-86,-98,-98,-45,-119,-145,-127,-158,0,3,1,6,4,2,0,-1,-1,-1,-1,52,158,51,-1,-52,-46,-5,53,156,24,201,52,161,52,5,-48,-44,-5,52,155,23,200,2,0,-4,-5,-3,-5,0,-1,-1,-3,-2,345,345,345,345,345,345,345,345,345,345,345,345,10.165058844,9.3926885335,10.620347395,11.880693872,10.158666298,11.523299303,10.696000406,9.2905191014,8.9574267756,9.0237063472,18.257629962,15.275477668,14.888337469,16.772744291,15.087128165,13.797634691,16.728341866,16.651859373,15.421024506,17.07876625,-8.092571118,-5.882789134,-4.267990074,-4.892050418,-4.928461867,-2.274335389,-6.032341461,-7.361340272,-6.46359773,-8.055059903,0.1480348375,0.0494352028,0.2977667494,0.1996755273,0.1005808544,0,-0.050691945,-0.050767864,-0.05089447,-0.050981392,7.7965014433,2.5211953432,-0.049627792,-2.595781854,-2.313359652,-0.252703932,2.6866730876,7.919786775,1.2214672876,10.24725975,7.9445362809,2.570630546,0.2481389578,-2.396106327,-2.212778798,-0.252703932,2.6359811426,7.869018911,1.1705728173,10.196278358 +050,3,7,40,093,Oklahoma,Major County,7527,7526,7519,7643,7705,7715,7791,7774,7760,7694,7609,7630,7579,-7,124,62,10,76,-17,-14,-66,-85,21,-51,29,90,115,114,104,106,100,111,97,114,110,12,82,86,92,80,95,104,109,123,84,74,17,8,29,22,24,11,-4,2,-26,30,36,-1,4,11,5,8,17,18,12,13,11,9,-23,111,22,-15,45,-43,-28,-81,-72,-20,-96,-24,115,33,-10,53,-26,-10,-69,-59,-9,-87,0,1,0,-2,-1,-2,0,1,0,0,0,77,77,77,77,77,77,77,77,77,77,77,77,11.871784725,14.985665885,14.785992218,13.41416226,13.62030196,12.874983906,14.36521289,12.677252826,14.961611654,14.465119337,10.816514972,11.206671879,11.932555123,10.318586354,12.206874398,13.389983263,14.106380225,16.075279357,11.024345429,9.7310802814,1.0552697533,3.7789940057,2.8534370947,3.0955759061,1.4134275618,-0.514999356,0.2588326647,-3.398026531,3.9372662248,4.7340390558,0.5276348767,1.4334115194,0.6485084306,1.0318586354,2.1843880501,2.3174971031,1.5529959881,1.6990132654,1.4436642824,1.183509764,14.641867827,2.8668230388,-1.945525292,5.8042048239,-5.525216833,-3.604995494,-10.48272292,-9.409919624,-2.62484415,-12.62410415,15.169502704,4.3002345582,-1.297016861,6.8360634593,-3.340828783,-1.287498391,-8.929726932,-7.710906358,-1.181179867,-11.44059438 +050,3,7,40,095,Oklahoma,Marshall County,15840,15838,15838,15952,16021,16064,16160,16267,16265,16371,16746,16946,17114,0,114,69,43,96,107,-2,106,375,200,168,32,192,205,200,178,180,210,173,216,186,203,64,190,200,174,202,219,201,201,200,182,185,-32,2,5,26,-24,-39,9,-28,16,4,18,5,26,12,5,17,10,26,7,5,2,5,27,86,54,12,104,138,-36,125,354,195,146,32,112,66,17,121,148,-10,132,359,197,151,0,0,-2,0,-1,-2,-1,2,0,-1,-1,329,329,329,329,329,329,329,329,329,329,329,329,12.079270211,12.823319676,12.466884837,11.047666336,11.101859561,12.910365179,10.601789435,13.044659842,11.041196723,11.920140928,11.953444479,12.510555781,10.846189808,12.537239325,13.507262466,12.357063814,12.317685991,12.078388743,10.803751632,10.863182619,0.1258257314,0.3127638945,1.6206950288,-1.489572989,-2.405402905,0.5533013648,-1.715896556,0.9662710994,0.2374450908,1.0569583089,1.6357345077,0.7506333469,0.3116721209,1.0551142006,0.6167699756,1.598426165,0.428974139,0.3019597186,0.1187225454,0.2935995302,5.4105064486,3.377850061,0.7480130902,6.454816286,8.5114256638,-2.213205459,7.6602524819,21.378748075,11.575448178,8.573106283,7.0462409563,4.1284834079,1.0596852112,7.5099304866,9.1281956394,-0.614779294,8.0892266209,21.680707794,11.694170723,8.8667058133 +050,3,7,40,097,Oklahoma,Mayes County,41259,41268,41314,41327,41161,40975,40934,40901,41031,40994,41173,41136,41152,46,13,-166,-186,-41,-33,130,-37,179,-37,16,128,491,494,513,529,475,469,460,488,484,458,72,491,531,462,443,526,470,529,526,493,594,56,0,-37,51,86,-51,-1,-69,-38,-9,-136,-1,4,5,7,10,19,9,6,6,3,4,-4,10,-133,-239,-132,4,124,29,211,-30,147,-5,14,-128,-232,-122,23,133,35,217,-27,151,-5,-1,-1,-5,-5,-5,-2,-3,0,-1,1,567,567,567,567,566,566,565,565,565,565,565,565,11.882721651,11.977499758,12.491477549,12.916773493,11.608724873,11.448518283,11.216092655,11.878247958,11.760560814,11.131635232,11.882721651,12.874599942,11.249634752,10.81688215,12.855135333,11.47292877,12.898506553,12.803193496,11.979248928,14.437098969,0,-0.897100184,1.2418427973,2.0998913428,-1.24641046,-0.024410487,-1.682413898,-0.924945538,-0.218688114,-3.305463737,0.0968042497,0.1212297546,0.1704490114,0.244173412,0.4643489949,0.2196943807,0.1462968607,0.1460440323,0.0728960381,0.0972195217,0.2420106243,-3.224711473,-5.819616246,-3.223089038,0.0977576831,3.0269003564,0.7071014934,5.1358818017,-0.728960381,3.5728174217,0.338814874,-3.103481719,-5.649167235,-2.978915626,0.5621066781,3.2465947371,0.8533983542,5.281925834,-0.656064343,3.6700369434 +050,3,7,40,099,Oklahoma,Murray County,13488,13488,13526,13598,13621,13682,13763,13859,13922,13927,13977,14081,13955,38,72,23,61,81,96,63,5,50,104,-126,39,150,148,162,162,160,168,151,155,153,163,33,194,182,184,176,191,194,180,209,191,217,6,-44,-34,-22,-14,-31,-26,-29,-54,-38,-54,0,0,1,-1,10,17,26,14,9,8,5,31,117,54,86,85,109,63,21,96,134,-77,31,117,55,85,95,126,89,35,105,142,-72,1,-1,2,-2,0,1,0,-1,-1,0,0,313,313,313,313,313,313,313,313,313,313,313,313,11.060315588,10.874756604,11.866827821,11.80542904,11.584968503,12.094597027,10.844195483,11.109518349,10.905980469,11.627906977,14.304674827,13.373011499,13.47837234,12.825651303,13.829556151,13.9663799,12.926855542,14.979931193,13.614655357,15.480097018,-3.244359239,-2.498254895,-1.611544519,-1.020222263,-2.244587648,-1.871782873,-2.08266006,-3.870412844,-2.708674888,-3.852190041,0,0.0734780852,-0.073252024,0.7287301876,1.2309029035,1.8717828732,1.0054220977,0.6450688073,0.5702473448,0.3566842631,8.6270461584,3.9678165987,6.2996740285,6.194206595,7.8922597929,4.535473885,1.5081331466,6.880733945,9.5516430252,-5.492937652,8.6270461584,4.0412946839,6.2264220049,6.9229367827,9.1231626964,6.4072567582,2.5135552444,7.5258027523,10.12189037,-5.136253389 +050,3,7,40,101,Oklahoma,Muskogee County,70990,70991,71121,70769,70538,70193,69751,69349,69028,69089,68431,68097,67610,130,-352,-231,-345,-442,-402,-321,61,-658,-334,-487,238,956,991,936,928,944,861,865,862,814,795,154,957,864,907,917,995,1012,857,999,899,924,84,-1,127,29,11,-51,-151,8,-137,-85,-129,9,49,32,10,14,32,42,27,29,18,17,42,-400,-389,-385,-466,-381,-208,29,-552,-268,-375,51,-351,-357,-375,-452,-349,-166,56,-523,-250,-358,-5,0,-1,1,-1,-2,-4,-3,2,1,0,3526,3526,3526,3524,3523,3523,3519,3500,3495,3499,3500,3505,13.475227289,14.026198278,13.301973268,13.262447836,13.572969087,12.444264582,12.525612343,12.536358348,11.924293918,11.71641846,13.489322715,12.228693554,12.889839481,13.105242097,14.306254493,14.626708196,12.40976853,14.528795812,13.169459745,13.617573154,-0.014095426,1.7975047238,0.4121337872,0.1572057394,-0.733285406,-2.182443614,0.1158438136,-1.992437464,-1.245165827,-1.901154694,0.6906758757,0.4529145761,0.142115099,0.200080032,0.460100647,0.6070372967,0.3909728708,0.4217568354,0.2636821751,0.2505397658,-5.638170414,-5.505742815,-5.471431312,-6.65980678,-5.478073329,-3.006279945,0.4199338242,-8.027923211,-3.925934607,-5.526612481,-4.947494538,-5.052828239,-5.329316213,-6.459726748,-5.017972682,-2.399242649,0.810906695,-7.606166376,-3.662252432,-5.276072715 +050,3,7,40,103,Oklahoma,Noble County,11561,11566,11565,11584,11537,11427,11555,11560,11420,11311,11304,11168,11113,-1,19,-47,-110,128,5,-140,-109,-7,-136,-55,47,142,126,142,134,121,125,126,131,116,109,35,128,131,134,133,127,133,165,144,138,130,12,14,-5,8,1,-6,-8,-39,-13,-22,-21,0,0,0,0,2,4,3,1,2,0,1,-11,5,-39,-119,127,6,-134,-72,5,-114,-35,-11,5,-39,-119,129,10,-131,-71,7,-114,-34,-2,0,-3,1,-2,1,-1,1,-1,0,0,273,273,273,273,273,273,273,273,273,273,273,273,12.268348525,10.899182561,12.367183418,11.661300148,10.46939217,10.879025239,11.086181866,11.585231041,10.323958704,9.784121,11.058793036,11.331689806,11.67044069,11.57427552,10.988535583,11.575282855,14.51761911,12.734910458,12.281950872,11.669135138,1.2095554884,-0.432507244,0.6967427277,0.087024628,-0.519143413,-0.696257615,-3.431437244,-1.149679416,-1.957992168,-1.885014138,0,0,0,0.1740492559,0.3460956089,0.2610966057,0.0879855704,0.1768737564,0,0.089762578,0.431984103,-3.373556507,-10.36404808,11.052127752,0.5191434134,-11.66231506,-6.334961066,0.4421843909,-10.14595942,-3.141690229,0.431984103,-3.373556507,-10.36404808,11.226177008,0.8652390223,-11.40121845,-6.246975496,0.6190581472,-10.14595942,-3.051927651 +050,3,7,40,105,Oklahoma,Nowata County,10536,10536,10524,10622,10607,10555,10503,10517,10405,10322,10289,10123,10076,-12,98,-15,-52,-52,14,-112,-83,-33,-166,-47,28,120,104,133,106,123,112,135,124,143,131,24,128,120,168,136,158,131,148,154,125,158,4,-8,-16,-35,-30,-35,-19,-13,-30,18,-27,0,1,0,2,2,1,3,2,3,2,1,-15,105,4,-18,-22,48,-94,-72,-5,-186,-21,-15,106,4,-16,-20,49,-91,-70,-2,-184,-20,-1,0,-3,-1,-2,0,-2,0,-1,0,0,157,157,157,157,157,157,157,157,157,157,157,157,11.349664239,9.7979179424,12.569700406,10.067432805,11.703139867,10.706433419,13.026487191,12.032409878,14.011365863,12.970939155,12.106308522,11.305289934,15.877516303,12.91670624,15.033301618,12.522703374,14.280889661,14.943476784,12.247697433,15.644338829,-0.756644283,-1.507371991,-3.307815896,-2.849273435,-3.330161751,-1.816269955,-1.25440247,-2.911066906,1.7636684303,-2.673399673,0.0945805353,0,0.1890180512,0.1899515624,0.0951474786,0.2867794666,0.1929849954,0.2911066906,0.1959631589,0.0990148027,9.9309562092,0.3768429978,-1.701162461,-2.089467186,4.5670789724,-8.98575662,-6.947459835,-0.485177818,-18.22457378,-2.079310857,10.025536745,0.3768429978,-1.51214441,-1.899515624,4.662226451,-8.698977153,-6.75447484,-0.194071127,-18.02861062,-1.980296054 +050,3,7,40,107,Oklahoma,Okfuskee County,12191,12191,12231,12333,12334,12298,12170,12110,12089,12077,12046,11956,11765,40,102,1,-36,-128,-60,-21,-12,-31,-90,-191,47,210,179,153,149,142,146,127,158,145,144,23,179,174,161,199,184,157,171,208,151,171,24,31,5,-8,-50,-42,-11,-44,-50,-6,-27,1,13,2,5,9,12,6,1,1,1,1,15,59,-6,-30,-85,-28,-16,31,17,-83,-165,16,72,-4,-25,-76,-16,-10,32,18,-82,-164,0,-1,0,-3,-2,-2,0,0,1,-2,0,1228,1228,1228,1228,1228,1228,1228,1227,1226,1226,1226,1226,17.098192477,14.513317388,12.422864566,12.179172797,11.696869852,12.066614323,10.510634776,13.099531567,12.082326473,12.141140761,14.574173587,14.107917461,13.072426112,16.266143534,15.156507414,12.975742799,14.152114541,17.244952949,12.58228481,14.417604654,2.5240188894,0.405399927,-0.649561546,-4.086970737,-3.459637562,-0.909128476,-3.641479765,-4.145421382,-0.499958337,-2.276463893,1.0584595343,0.1621599708,0.4059759662,0.7356547327,0.9884678748,0.4958882598,0.0827609037,0.0829084276,0.0833263895,0.0843134775,4.8037778863,-0.486479912,-2.435855797,-6.947850253,-2.306425041,-1.322368693,2.5655880162,1.4094432699,-6.916090326,-13.91172379,5.8622374206,-0.324319942,-2.029879831,-6.212195521,-1.317957166,-0.826480433,2.64834892,1.4923516976,-6.832763936,-13.82741031 +050,3,7,40,109,Oklahoma,Oklahoma County,718633,718385,720779,730890,743477,756286,766928,777406,784684,786126,790926,797563,804041,2394,10111,12587,12809,10642,10478,7278,1442,4800,6637,6478,2997,11910,11930,12394,12337,12555,12410,11615,11421,11256,11194,1519,6802,6525,6875,7062,6934,6957,7161,7359,7189,7683,1478,5108,5405,5519,5275,5621,5453,4454,4062,4067,3511,429,2336,2423,2015,2186,3056,2391,1333,1286,857,692,497,2669,4659,5181,3191,1837,-523,-4319,-523,1689,2237,926,5005,7082,7196,5377,4893,1868,-2986,763,2546,2929,-10,-2,100,94,-10,-36,-43,-26,-25,24,38,15025,15022,15014,14925,14889,14790,14721,14751,14810,14864,14796,14800,16.408699228,16.183216255,16.527944749,16.198643132,16.259436106,15.888969266,14.788548583,14.483986577,14.171958383,13.978486567,9.3712822964,8.8512561662,9.1681152289,9.2724988084,8.9799227369,8.9072972748,9.1175890146,9.3326028565,9.0513689424,9.5941318828,7.0374169318,7.3319600886,7.3598295197,6.9261443238,7.2795133695,6.9816719907,5.6709595686,5.151383721,5.1205894407,4.3843546844,3.218364517,3.2868342821,2.6870912271,2.8702467283,3.9576930897,3.0612832807,1.6972135395,1.630891055,1.0790128229,0.864133706,3.6771467876,6.3200003798,6.9090916365,4.189824936,2.3790190464,-0.669615707,-5.499073726,-0.663262847,2.1265491923,2.7934495668,6.8955113046,9.6068346619,9.5961828636,7.0600716643,6.3367121361,2.3916675736,-3.801860187,0.9676282076,3.2055620152,3.6575832728 +050,3,7,40,111,Oklahoma,Okmulgee County,40069,40061,40082,39787,39555,39404,39086,39072,39061,38831,38223,38417,38234,21,-295,-232,-151,-318,-14,-11,-230,-608,194,-183,133,509,526,503,513,505,451,480,431,421,415,150,511,496,533,471,534,507,565,557,488,576,-17,-2,30,-30,42,-29,-56,-85,-126,-67,-161,1,12,5,4,3,3,4,3,3,1,2,40,-306,-266,-119,-366,16,43,-149,-483,260,-25,41,-294,-261,-115,-363,19,47,-146,-480,261,-23,-3,1,-1,-6,3,-4,-2,1,-2,0,1,1374,1374,1374,1374,1374,1374,1375,1375,1376,1376,1376,1376,12.745871364,13.259055733,12.740789524,13.071728883,12.922541518,11.544417852,12.324757356,11.186959794,10.986430063,10.828299696,12.795953374,12.502835825,13.500677567,12.001528857,13.664628061,12.977871066,14.507266472,14.457393516,12.734864301,15.029158132,-0.050082009,0.7562199087,-0.759888043,1.0702000255,-0.742086543,-1.433453214,-2.182509115,-3.270433722,-1.748434238,-4.200858436,0.3004920557,0.1260366515,0.1013184058,0.076442859,0.0767675734,0.1023895153,0.0770297335,0.0778674696,0.0260960334,0.0521845768,-7.662547421,-6.705149858,-3.014222571,-9.326028793,0.409427058,1.1006872896,-3.825810096,-12.5366626,6.7849686848,-0.652307211,-7.362055366,-6.579113206,-2.912904165,-9.249585935,0.4861946314,1.2030768049,-3.748780363,-12.45879513,6.8110647182,-0.600122634 +050,3,7,40,113,Oklahoma,Osage County,47472,47461,47487,47775,47454,47387,47490,47333,47364,47348,47074,46942,46642,26,288,-321,-67,103,-157,31,-16,-274,-132,-300,112,522,400,425,449,446,441,420,436,440,432,72,472,474,431,445,472,462,453,495,522,597,40,50,-74,-6,4,-26,-21,-33,-59,-82,-165,14,28,16,3,7,8,16,10,9,5,6,-25,210,-265,-61,101,-137,40,9,-223,-55,-143,-11,238,-249,-58,108,-129,56,19,-214,-50,-137,-3,0,2,-3,-9,-2,-4,-2,-1,0,2,1504,1504,1504,1504,1504,1504,1504,1498,1497,1497,1497,1497,10.959249228,8.4008022766,8.9623685959,9.4648861157,9.4070004113,9.3139170195,8.8689923135,9.2351358794,9.3601089176,9.2323474098,9.9095127123,9.9549506978,9.0888961525,9.3805664176,9.9553905698,9.7574368776,9.5658417096,10.484844634,11.104492852,12.758591212,1.0497365161,-1.554148421,-0.126527557,0.0843196981,-0.548390159,-0.443519858,-0.696849396,-1.249708754,-1.744383935,-3.526243802,0.587852449,0.3360320911,0.0632637783,0.1475594717,0.1687354334,0.3379198919,0.2111664837,0.1906335388,0.1063648741,0.1282270474,4.4088933678,-5.565531508,-1.286363493,2.1290723779,-2.889594297,0.8447997297,0.1900498353,-4.723475461,-1.170013615,-3.056077962,4.9967458168,-5.229499417,-1.223099714,2.2766318497,-2.720858863,1.1827196215,0.4012163189,-4.532841922,-1.063648741,-2.927850915 +050,3,7,40,115,Oklahoma,Ottawa County,31848,31848,31860,31876,32196,32188,31955,31890,31617,31407,31332,31180,30879,12,16,320,-8,-233,-65,-273,-210,-75,-152,-301,107,450,461,485,435,486,414,408,400,414,393,75,438,464,419,413,468,470,479,456,447,531,32,12,-3,66,22,18,-56,-71,-56,-33,-138,2,26,20,12,15,19,19,13,17,13,12,-18,-23,300,-84,-272,-101,-234,-153,-35,-131,-173,-16,3,320,-72,-257,-82,-215,-140,-18,-118,-161,-4,1,3,-2,2,-1,-2,1,-1,-1,-2,968,968,968,968,968,968,968,968,969,969,970,971,14.120748086,14.390061181,15.065854871,13.563444179,15.224371525,13.037932826,12.947448591,12.751239261,13.245456872,12.665366828,13.744194804,14.483705831,13.015656064,12.877476888,14.660505913,14.801517943,15.200558517,14.536412758,14.301254159,17.112747547,0.3765532823,-0.09364465,2.0501988072,0.6859672918,0.563865612,-1.763585117,-2.253109926,-1.785173497,-1.055797287,-4.447380718,0.815865445,0.6242976651,0.3727634195,0.4677049717,0.5951914794,0.598359236,0.4125412541,0.5419276686,0.4159201433,0.3867287581,-0.721727124,9.3644649769,-2.609343936,-8.481050154,-3.163912601,-7.36926638,-4.855293222,-1.115733435,-4.191195291,-5.575339596,0.0941383206,9.988762642,-2.236580517,-8.013345182,-2.568721121,-6.770907144,-4.442751968,-0.573805767,-3.775275147,-5.188610838 +050,3,7,40,117,Oklahoma,Pawnee County,16577,16569,16588,16731,16443,16453,16350,16436,16461,16417,16372,16379,16381,19,143,-288,10,-103,86,25,-44,-45,7,2,52,190,184,190,211,200,193,186,220,176,185,40,215,220,213,216,197,230,188,214,207,202,12,-25,-36,-23,-5,3,-37,-2,6,-31,-17,2,6,4,6,9,5,7,7,6,4,5,7,162,-259,29,-111,78,57,-49,-56,33,16,9,168,-255,35,-102,83,64,-42,-50,37,21,-2,0,3,-2,4,0,-2,0,-1,1,-2,194,194,194,194,194,194,194,194,194,194,194,194,11.404904109,11.093024658,11.55155642,12.864677011,12.200329409,11.733592729,11.314556847,13.419134466,10.747763427,11.294261294,12.905549386,13.263399047,12.949902724,13.169527177,12.017324468,13.983037967,11.436218748,13.053158071,12.640835394,12.332112332,-1.500645277,-2.17037439,-1.398346304,-0.304850166,0.1830049411,-2.249445238,-0.121661902,0.3659763945,-1.893071967,-1.037851038,0.3601548666,0.24115271,0.3647859922,0.5487302991,0.3050082352,0.4255707207,0.4258166555,0.3659763945,0.2442673506,0.3052503053,9.724181398,-15.61463797,1.7631322957,-6.767673688,4.7581284695,3.4653615831,-2.980716589,-3.415779682,2.0152056426,0.9768009768,10.084336265,-15.37348526,2.1279182879,-6.218943389,5.0631367047,3.8909323039,-2.554899933,-3.049803288,2.2594729932,1.2820512821 +050,3,7,40,119,Oklahoma,Payne County,77350,77347,77420,78253,78754,79744,80583,81443,81924,81998,82198,81683,81755,73,833,501,990,839,860,481,74,200,-515,72,207,936,874,935,893,946,905,846,848,829,813,102,529,569,542,539,567,565,593,613,617,664,105,407,305,393,354,379,340,253,235,212,149,55,570,365,446,482,772,432,325,397,292,226,-85,-144,-166,164,16,-288,-291,-509,-435,-1022,-307,-30,426,199,610,498,484,141,-184,-38,-730,-81,-2,0,-3,-13,-13,-3,0,5,3,3,4,7764,7766,7766,7768,7769,7768,7769,7774,7787,7789,7787,7786,12.025206683,11.133261574,11.798256129,11.13973317,11.677138237,11.079348951,10.321982406,10.329118858,10.117097162,9.9487267343,6.7962973669,7.2480844803,6.8392030183,6.7237583189,6.9988767235,6.91694161,7.2351484243,7.4666861556,7.5298539794,8.1254053525,5.2289093163,3.885177094,4.9590531111,4.4159748514,4.6782615136,4.1624073405,3.086833982,2.8624327024,2.5872431826,1.8233213818,7.3230425315,4.6494742273,5.627831266,6.0127115208,9.5293347981,5.2887057974,3.9653005698,4.8356841823,3.5635613646,2.7655747133,-1.850031797,-2.114555402,2.0694267436,0.1995920837,-3.554985002,-3.562530989,-6.210270739,-5.298545641,-12.47246478,-3.75677627,5.473010734,2.5349188253,7.6972580096,6.2123036045,5.9743497957,1.7261748089,-2.244970169,-0.462861458,-8.908903412,-0.991201557 +050,3,7,40,121,Oklahoma,Pittsburg County,45837,45827,45799,45721,45542,45267,44853,44725,44397,44182,43842,43673,43679,-28,-78,-179,-275,-414,-128,-328,-215,-340,-169,6,121,517,535,549,548,487,550,502,512,547,522,132,594,593,603,632,641,631,587,653,594,632,-11,-77,-58,-54,-84,-154,-81,-85,-141,-47,-110,6,13,-3,1,10,6,18,11,12,6,6,-17,-11,-112,-219,-338,25,-263,-140,-210,-129,109,-11,2,-115,-218,-328,31,-245,-129,-198,-123,115,-6,-3,-6,-3,-2,-5,-2,-1,-1,1,1,2433,2433,2433,2433,2429,2425,2418,2418,2416,2417,2415,2417,11.298076923,11.724357078,12.091312535,12.161562361,10.873205475,12.342631449,11.334514953,11.633190948,12.500714163,11.951643923,12.980769231,12.995408873,13.280621965,14.025743453,14.311549711,14.160364444,13.253705732,14.836862674,13.574815746,14.470189578,-1.682692308,-1.271051795,-1.18930943,-1.864181092,-3.438344236,-1.817732995,-1.919190779,-3.203671726,-1.074101583,-2.518545654,0.2840909091,-0.065744058,0.0220242487,0.2219263205,0.1339614638,0.4039406656,0.2483658655,0.2726529128,0.137119351,0.1373752175,-0.240384615,-2.454444846,-4.823310465,-7.501109632,0.5581727656,-5.902021947,-3.161020106,-4.771425975,-2.948066046,2.4956497848,0.0437062937,-2.520188905,-4.801286216,-7.279183311,0.6921342294,-5.498081282,-2.912654241,-4.498773062,-2.810946695,2.6330250023 +050,3,7,40,123,Oklahoma,Pontotoc County,37492,37488,37594,37751,38064,38162,38292,38343,38499,38348,38328,38352,38397,106,157,313,98,130,51,156,-151,-20,24,45,139,568,552,513,565,515,536,532,515,494,498,65,467,406,411,400,439,461,441,464,505,541,74,101,146,102,165,76,75,91,51,-11,-43,5,33,35,53,49,66,41,26,31,24,16,30,26,133,-49,-78,-87,42,-268,-102,10,69,35,59,168,4,-29,-21,83,-242,-71,34,85,-3,-3,-1,-8,-6,-4,-2,0,0,1,3,1696,1696,1696,1696,1696,1696,1698,1700,1703,1702,1699,1699,15.077311036,14.561762184,13.459974287,14.780129228,13.440334051,13.950704042,13.845693391,13.433147269,12.884715702,12.977367783,12.396310306,10.710281607,10.78372209,10.463808303,11.456906113,11.998646573,11.4773511,12.102874433,13.171622327,14.097903556,2.68100073,3.8514805777,2.6762521974,4.316320925,1.9834279376,1.9520574686,2.3683422905,1.3302728364,-0.286906625,-1.120535772,0.8759705355,0.9233001385,1.390601632,1.2818165171,1.7224505774,1.0671247495,0.6766692259,0.8085972143,0.6259780908,0.4169435432,0.6901586038,3.5085405263,-1.285650565,-2.040442619,-2.270503034,1.0931521824,-6.974898174,-2.660545673,0.2608242045,1.7980690302,1.5661291393,4.4318406648,0.1049510666,-0.758626102,-0.548052456,2.1602769319,-6.298228948,-1.851948458,0.8868022953,2.2150125735 +050,3,7,40,125,Oklahoma,Pottawatomie County,69442,69447,69653,70071,70524,70921,71561,71510,72051,72232,72568,72703,72998,206,418,453,397,640,-51,541,181,336,135,295,242,987,898,922,928,920,891,879,877,838,849,158,768,772,760,790,874,844,907,886,853,883,84,219,126,162,138,46,47,-28,-9,-15,-34,4,41,25,37,27,39,45,30,35,24,19,117,160,307,207,477,-130,450,182,312,125,307,121,201,332,244,504,-91,495,212,347,149,326,1,-2,-5,-9,-2,-6,-1,-3,-2,1,3,3053,3053,3053,3053,3052,3053,3053,3044,3041,3042,3043,3049,14.127852051,12.774280735,13.036869455,13.026206819,12.860747461,12.412841928,12.184387627,12.113259669,11.537058325,11.654003747,10.993100684,10.981898361,10.746226448,11.089120029,12.217710088,11.758067999,12.57251374,12.237569061,11.743568916,12.120712967,3.134751367,1.7923823749,2.2906430061,1.9370867899,0.6430373731,0.6547739289,-0.388126113,-0.124309392,-0.206510591,-0.46670922,0.5868712605,0.3556314236,0.5231715508,0.3789952415,0.5451838598,0.6269112085,0.4158494071,0.4834254144,0.3304169449,0.2608080933,2.2902293092,4.3671538817,2.92693273,6.6955825999,-1.817279533,6.2691120848,2.5228197362,4.3093922652,1.7209215879,4.2141097178,2.8771005697,4.7227853053,3.4501042808,7.0745778414,-1.272095673,6.8960232932,2.9386691433,4.7928176796,2.0513385328,4.4749178111 +050,3,7,40,127,Oklahoma,Pushmataha County,11572,11577,11593,11415,11254,11203,11111,11155,11047,11089,11139,11030,10970,16,-178,-161,-51,-92,44,-108,42,50,-109,-60,29,125,124,121,147,157,136,114,114,108,101,20,188,154,162,184,176,155,168,141,156,172,9,-63,-30,-41,-37,-19,-19,-54,-27,-48,-71,0,6,9,4,5,8,0,0,0,0,0,7,-121,-142,-12,-61,54,-88,97,78,-62,13,7,-115,-133,-8,-56,62,-88,97,78,-62,13,0,0,2,-2,1,1,-1,-1,-1,1,-2,110,110,110,110,110,110,110,110,110,110,110,110,10.865785814,10.940050289,10.776149976,13.175584835,14.102218629,12.251148545,10.29996386,10.257333093,9.743335288,9.1818181818,16.342141864,13.586836649,14.427572694,16.4918885,15.808856553,13.962706063,15.178894109,12.686701458,14.073706527,15.636363636,-5.47635605,-2.64678636,-3.651422719,-3.316303666,-1.706637923,-1.711557517,-4.878930249,-2.429368364,-4.330371239,-6.454545455,0.5215577191,0.7940359081,0.3562363628,0.448149144,0.7185843888,0,0,0,0,0,-10.51808067,-12.52812211,-1.068709088,-5.467419557,4.8504446241,-7.927213765,8.7640043368,7.0181752744,-5.593396184,1.1818181818,-9.996522949,-11.7340862,-0.712472726,-5.019270413,5.5690290128,-7.927213765,8.7640043368,7.0181752744,-5.593396184,1.1818181818 +050,3,7,40,129,Oklahoma,Roger Mills County,3647,3647,3647,3762,3770,3737,3767,3782,3683,3673,3657,3593,3570,0,115,8,-33,30,15,-99,-10,-16,-64,-23,17,53,49,43,48,53,56,51,37,36,34,18,37,39,25,39,41,28,49,31,25,28,-1,16,10,18,9,12,28,2,6,11,6,0,4,-1,0,0,0,0,0,0,0,0,1,94,-1,-51,19,4,-127,-11,-23,-73,-30,1,98,-2,-51,19,4,-127,-11,-23,-73,-30,0,1,0,0,2,-1,0,-1,1,-2,1,11,11,11,11,11,11,11,11,11,11,11,11,14.306924011,13.011152416,11.455974424,12.793176972,14.041594913,15.003348962,13.866231648,10.095497954,9.9310344828,9.493229094,9.9878526117,10.355815189,6.6604502464,10.39445629,10.862365876,7.5016744809,13.322457858,8.4583901774,6.8965517241,7.8179533715,4.3190713996,2.6553372278,4.7955241774,2.3987206823,3.179229037,7.5016744809,0.5437737901,1.6371077763,3.0344827586,1.6752757225,1.0797678499,-0.265533723,0,0,0,0,0,0,0,0,25.374544473,-0.265533723,-13.5873185,5.0639658849,1.0597430123,-34.02545211,-2.990755846,-6.275579809,-20.13793103,-8.376378612,26.454312323,-0.531067446,-13.5873185,5.0639658849,1.0597430123,-34.02545211,-2.990755846,-6.275579809,-20.13793103,-8.376378612 +050,3,7,40,131,Oklahoma,Rogers County,86905,86910,87016,87567,88117,88752,89394,90113,91061,91472,91957,92616,93155,106,551,550,635,642,719,948,411,485,659,539,240,914,987,964,1055,992,1044,993,1053,1012,1046,183,715,752,814,828,929,863,913,953,943,921,57,199,235,150,227,63,181,80,100,69,125,14,45,30,34,46,51,68,50,38,36,30,46,310,303,459,389,610,702,287,354,555,381,60,355,333,493,435,661,770,337,392,591,411,-11,-3,-18,-8,-20,-5,-3,-6,-7,-1,3,1216,1216,1216,1216,1216,1216,1216,1215,1215,1215,1216,1217,10.470664383,11.236082967,10.900723134,11.844217664,11.052493775,11.524832481,10.880224398,11.481281586,10.96585091,11.261176395,8.1909464266,8.5608251178,9.2045525219,9.2957461857,10.350571287,9.5267532869,10.003670569,10.390941454,10.218179257,9.9154335176,2.2797179565,2.6752578493,1.6961706121,2.5484714785,0.7019224877,1.9980791946,0.8765538286,1.0903401316,0.747671653,1.345742877,0.5155141108,0.3415222786,0.3844653388,0.5164303437,0.5682229662,0.7506595869,0.5478461429,0.41432925,0.3900895581,0.3229782905,3.5513194297,3.4493750142,5.1902820732,4.3672044278,6.7963923412,7.7494563238,3.1446368602,3.8598040659,6.0138806868,4.101824289,4.0668335405,3.7908972929,5.5747474119,4.8836347715,7.3646153075,8.5001159107,3.6924830031,4.2741333159,6.4039702448,4.4248025795 +050,3,7,40,133,Oklahoma,Seminole County,25482,25483,25487,25443,25388,25445,25361,25410,25157,24864,24529,24321,24248,4,-44,-55,57,-84,49,-253,-293,-335,-208,-73,82,345,318,366,319,308,348,344,306,313,305,55,318,354,345,357,384,330,353,361,318,349,27,27,-36,21,-38,-76,18,-9,-55,-5,-44,1,3,3,3,9,7,9,7,8,5,8,-20,-74,-20,38,-52,121,-280,-291,-289,-206,-38,-19,-71,-17,41,-43,128,-271,-284,-281,-201,-30,-4,0,-2,-5,-3,-3,0,0,1,-2,1,581,581,581,581,581,581,581,581,581,581,581,581,13.548007069,12.512049733,14.400094427,12.55757194,12.13291052,13.763917179,13.754223226,12.390419695,12.814738997,12.559451502,12.487728254,13.928508194,13.573859501,14.053458253,15.126745583,13.051990429,14.11407209,14.617455915,13.019447288,14.371306801,1.0602788141,-1.41645846,0.8262349261,-1.495886313,-2.993835063,0.7119267506,-0.359848863,-2.22703622,-0.204708291,-1.811855299,0.1178087571,0.118038205,0.1180335609,0.3542888635,0.2757479664,0.3559633753,0.2798824494,0.323932541,0.2047082907,0.3294282361,-2.905949342,-0.786921367,1.4950917711,-2.047002323,4.7665005613,-11.07441612,-11.63511325,-11.70206305,-8.433981576,-1.564784122,-2.788140585,-0.668883162,1.613125332,-1.692713459,5.0422485277,-10.71845275,-11.3552308,-11.3781305,-8.229273286,-1.235355885 +050,3,7,40,135,Oklahoma,Sequoyah County,42391,42430,42513,42428,42064,41838,41879,41811,41887,41762,41651,41599,41538,83,-85,-364,-226,41,-68,76,-125,-111,-52,-61,132,559,558,509,511,526,500,488,552,551,546,79,485,492,525,544,510,541,564,535,616,599,53,74,66,-16,-33,16,-41,-76,17,-65,-53,0,8,14,23,25,47,26,19,16,12,10,32,-167,-453,-231,59,-127,95,-66,-144,1,-20,32,-159,-439,-208,84,-80,121,-47,-128,13,-10,-2,0,9,-2,-10,-4,-4,-2,0,0,2,463,463,463,463,463,464,464,463,463,463,462,464,13.162077207,13.208351086,12.133203023,12.20779531,12.570199546,11.947716791,11.667802365,13.235347008,13.237237237,13.134945933,11.419691315,11.646073001,12.514600367,12.996165653,12.187836062,12.927429568,13.484919126,12.827736684,14.798798799,14.409949842,1.7423858914,1.5622780855,-0.381397345,-0.788370343,0.3823634843,-0.979712777,-1.817116762,0.4076103245,-1.561561562,-1.275003909,0.1883660423,0.3313923212,0.5482586827,0.5972502598,1.1231927351,0.6212812731,0.4542791904,0.3836332466,0.2882882883,0.2405667753,-3.932141133,-10.72290868,-5.506424162,1.4095106131,-3.035010157,2.2700661904,-1.578022451,-3.45269922,0.024024024,-0.481133551,-3.743775091,-10.39151636,-4.958165479,2.0067608729,-1.911817421,2.8913474635,-1.123743261,-3.069065973,0.3123123123,-0.240566775 +050,3,7,40,137,Oklahoma,Stephens County,45048,45051,45105,45115,44901,45000,44590,44604,44044,43374,43231,43258,43100,54,10,-214,99,-410,14,-560,-670,-143,27,-158,141,531,544,523,601,534,550,486,496,528,512,115,551,557,570,578,604,547,543,598,555,589,26,-20,-13,-47,23,-70,3,-57,-102,-27,-77,5,13,33,16,30,41,44,31,27,19,17,29,19,-232,138,-466,49,-608,-647,-68,35,-99,34,32,-199,154,-436,90,-564,-616,-41,54,-82,-6,-2,-2,-8,3,-6,1,3,0,0,1,540,540,540,540,540,540,540,540,540,540,540,540,11.771225892,12.086740135,11.635020745,13.416675968,11.97389959,12.40862738,11.118991512,11.454304024,12.209645157,11.857615971,12.214586566,12.375577675,12.680615344,12.903225806,13.543511895,12.340943958,12.423070763,13.809826223,12.834002012,13.640890248,-0.443360674,-0.28883754,-1.045594599,0.5134501618,-1.569612306,0.0676834221,-1.304079251,-2.355522198,-0.624356855,-1.783274277,0.288184438,0.7332029861,0.3559470974,0.6697176024,0.9193443505,0.9926901904,0.7092360841,0.623520582,0.439362231,0.3937099053,0.4211926402,-5.154639175,3.0700437148,-10.40294676,1.098728614,-13.71717354,-14.80244343,-1.570348132,0.8093514782,-2.292781213,0.7093770783,-4.421436189,3.4259908121,-9.733229155,2.0180729645,-12.72448335,-14.09320735,-0.94682755,1.2487137093,-1.899071308 +050,3,7,40,139,Oklahoma,Texas County,20640,20640,20800,21257,21598,22052,21741,21452,21242,21052,20659,20216,19997,160,457,341,454,-311,-289,-210,-190,-393,-443,-219,90,355,382,366,387,381,363,389,359,358,335,50,147,147,136,166,198,199,172,188,140,130,40,208,235,230,221,183,164,217,171,218,205,28,169,72,62,66,107,191,132,136,97,79,86,79,35,157,-613,-587,-568,-541,-704,-758,-500,114,248,107,219,-547,-480,-377,-409,-568,-661,-421,6,1,-1,5,15,8,3,2,4,0,-3,572,572,572,572,572,572,572,572,573,573,574,574,16.881850822,17.827558045,16.76975945,17.674057498,17.641747505,17.004731344,18.395044214,17.21368464,17.516819572,16.661278691,6.9905128754,6.8603430172,6.2313860252,7.5811202704,9.1681522469,9.3221529957,8.1335414007,9.0144086692,6.8501529052,6.4655708353,9.8913379461,10.967215027,10.538373425,10.092937227,8.4735952585,7.6825783482,10.261502814,8.1992759704,10.666666667,10.195707856,8.0367120812,3.3601680084,2.8407789233,3.0141803485,4.9545065173,8.9473930763,6.2420201447,6.5210615905,4.74617737,3.9290776615,3.7568062392,1.6334150041,7.1935853379,-27.99534172,-27.18033015,-26.60795428,-25.58282499,-33.75608353,-37.08868502,-24.86758014,11.79351832,4.9935830125,10.034364261,-24.98116137,-22.22582363,-17.6605612,-19.34080484,-27.23502194,-32.34250765,-20.93850247 +050,3,7,40,141,Oklahoma,Tillman County,7992,7991,7983,8001,7826,7726,7668,7565,7520,7399,7325,7260,7229,-8,18,-175,-100,-58,-103,-45,-121,-74,-65,-31,23,119,101,104,96,89,83,79,82,74,73,26,104,96,95,104,97,94,100,103,73,81,-3,15,5,9,-8,-8,-11,-21,-21,1,-8,4,3,1,5,15,16,38,25,12,11,11,-8,1,-189,-114,-67,-111,-72,-124,-65,-77,-33,-4,4,-188,-109,-52,-95,-34,-99,-53,-66,-22,-1,-1,8,0,2,0,0,-1,0,0,-1,267,267,267,267,267,267,267,267,267,267,267,267,14.88988989,12.762999937,13.374485597,12.472391841,11.685157224,11.004308916,10.590522153,11.138277642,10.147411724,10.076609842,13.013013013,12.131168257,12.217078189,13.511757828,12.735508436,12.462711303,13.405724244,13.99076338,10.010284539,11.180895852,1.8768768769,0.63183168,1.1574074074,-1.039365987,-1.050351211,-1.458402386,-2.815202091,-2.852485738,0.1371271855,-1.10428601,0.3753753754,0.126366336,0.6430041152,1.9488112252,2.1007024224,5.0381173351,3.3514310611,1.62999185,1.5083990401,1.5183932639,0.1251251251,-23.88323751,-14.66049383,-8.704690139,-14.57362306,-9.54590653,-16.62309806,-8.829122521,-10.55879328,-4.555179792,0.5005005005,-23.75687117,-14.01748971,-6.755878914,-12.47292063,-4.507789195,-13.271667,-7.199130671,-9.050394241,-3.036786528 +050,3,7,40,143,Oklahoma,Tulsa County,603403,603451,605024,609323,615376,623978,631241,640851,646328,646874,648496,652166,657589,1573,4299,6053,8602,7263,9610,5477,546,1622,3670,5423,2327,9171,9337,9199,9290,9658,9606,9503,8994,8837,8841,1267,5531,5332,5738,5658,5806,5757,5881,6153,6203,6617,1060,3640,4005,3461,3632,3852,3849,3622,2841,2634,2224,212,1529,1182,1224,1587,2278,2001,1181,1252,758,666,346,-845,966,3907,2118,3493,-342,-4253,-2472,259,2504,558,684,2148,5131,3705,5771,1659,-3072,-1220,1017,3170,-45,-25,-100,10,-74,-13,-31,-4,1,19,29,9866,9866,9865,9866,9868,9869,9866,9856,9857,9857,9857,9858,15.104414142,15.247828242,14.844830452,14.802197863,15.184436346,14.92566302,14.696853237,13.886379953,13.588464951,13.500234777,9.109422595,8.7074456662,9.2596626952,9.0151599044,9.1282705968,8.9451428278,9.0952534871,9.4999884203,9.5382197681,10.104179789,5.9949915469,6.5403825756,5.5851677568,5.7870379591,6.056165749,5.9805201918,5.6015997501,4.3863915329,4.0502451828,3.3960549874,2.5182258448,1.9302702133,1.9752225756,2.5286424122,3.5815019668,3.1091246827,1.8264741317,1.9330384369,1.165560307,1.0169840924,-1.391694466,1.5775304789,6.3048975515,3.3747099112,5.4917411634,-0.531394623,-6.577472042,-3.816670141,0.3982587329,3.8236158671,1.1265313786,3.5078006923,8.2801201271,5.9033523234,9.0732431302,2.5777300593,-4.750997911,-1.883631704,1.5638190398,4.8405999595 +050,3,7,40,145,Oklahoma,Wagoner County,73085,73084,73428,74041,74988,75660,75664,76753,77688,79021,80218,81466,82925,344,613,947,672,4,1089,935,1333,1197,1248,1459,231,860,864,931,869,867,865,895,878,874,891,99,604,582,641,666,610,609,654,646,729,845,132,256,282,290,203,257,256,241,232,145,46,2,13,23,19,40,62,65,36,32,19,32,201,345,638,370,-223,768,616,1055,931,1089,1387,203,358,661,389,-183,830,681,1091,963,1108,1419,9,-1,4,-7,-16,2,-2,1,2,-5,-6,319,319,319,319,319,319,319,319,319,319,319,319,11.663468254,11.59505868,12.359938399,11.485289842,11.376683703,11.201688671,11.422445424,11.027449306,10.811211994,10.84000949,8.1915521228,7.8105603607,8.5099038819,8.802304988,8.0043564694,7.8865068214,8.3466807905,8.1135902637,9.0175898667,10.280368147,3.4719161315,3.7844983191,3.8500345176,2.6829848537,3.3723272338,3.3151818494,3.0757646338,2.9138590421,1.7936221271,0.5596413429,0.1763082411,0.3086647565,0.2522436408,0.5286669662,0.8135575428,0.8417453914,0.4594503187,0.401911592,0.2350263477,0.3893157168,4.6789494741,8.5620919418,4.9121130052,-2.947318337,10.077616014,7.9771563251,13.464446841,11.69311538,13.470720665,16.8744031,4.8552577152,8.8707566984,5.164356646,-2.418651371,10.891173557,8.8189017165,13.92389716,12.095026972,13.705747013,17.263718817 +050,3,7,40,147,Oklahoma,Washington County,50976,50979,51071,51378,51655,51684,52044,52144,52099,52107,51881,51665,52222,92,307,277,29,360,100,-45,8,-226,-216,557,157,653,618,609,618,690,654,652,566,610,575,114,576,587,605,601,674,613,657,677,653,683,43,77,31,4,17,16,41,-5,-111,-43,-108,14,105,97,86,109,141,130,98,100,74,66,41,126,158,-56,243,-51,-215,-81,-216,-247,604,55,231,255,30,352,90,-85,17,-116,-173,670,-6,-1,-9,-5,-9,-6,-1,-4,1,0,-5,798,798,798,798,798,798,798,798,798,798,798,798,12.747806226,11.996156571,11.78645042,11.915779732,13.245287365,12.547605115,12.513674836,10.885871447,11.782203079,11.069719984,11.244619274,11.394407617,11.709035311,11.587999383,12.938150267,11.760981553,12.6096386,13.020733162,12.61275182,13.148902173,1.5031869516,0.6017489542,0.0774151095,0.3277803486,0.3071370983,0.7866235623,-0.095963764,-2.134861715,-0.830548742,-2.079182188,2.0498003885,1.882891889,1.6644248541,2.1016504705,2.706645679,2.4941722706,1.880889776,1.9232988422,1.4293164391,1.2706113373,2.4597604662,3.0669785409,-1.083811533,4.6853308653,-0.978999501,-4.124977217,-1.554612978,-4.154325499,-4.770826493,11.628018905,4.5095608547,4.9498704299,0.5806133212,6.7869813358,1.7276461781,-1.630804946,0.3262767979,-2.231026657,-3.341510054,12.898630242 +050,3,7,40,149,Oklahoma,Washita County,11629,11558,11544,11550,11586,11706,11567,11697,11428,11061,11064,10943,10830,-14,6,36,120,-139,130,-269,-367,3,-121,-113,40,150,137,148,163,181,150,139,145,117,122,47,140,141,132,130,138,142,164,130,162,151,-7,10,-4,16,33,43,8,-25,15,-45,-29,1,1,0,1,4,5,4,3,4,3,3,-6,-4,41,102,-179,81,-283,-346,-15,-78,-87,-5,-3,41,103,-175,86,-279,-343,-11,-75,-84,-2,-1,-1,1,3,1,2,1,-1,-1,0,206,206,206,206,206,206,206,206,206,206,206,206,12.990387114,11.843015214,12.708226,14.007648348,15.560522696,12.972972973,12.361599004,13.107344633,10.632980415,11.20654021,12.124361306,12.18879668,11.33436373,11.171744081,11.863823934,12.281081081,14.584908177,11.751412429,14.722588267,13.870389932,0.8660258076,-0.345781466,1.3738622703,2.8359042667,3.696698762,0.6918918919,-2.223309173,1.3559322034,-4.089607852,-2.663849722,0.0866025808,0,0.0858663919,0.3437459717,0.4298486933,0.3459459459,0.2667971008,0.3615819209,0.2726405235,0.2755706609,-0.346410323,3.5442600277,8.7583719732,-15.38263223,6.9635488308,-24.47567568,-30.77059896,-1.355932203,-7.08865361,-7.991549166,-0.259807742,3.5442600277,8.8442383651,-15.03888626,7.3933975241,-24.12972973,-30.50380186,-0.994350282,-6.816013087,-7.715978505 +050,3,7,40,151,Oklahoma,Woods County,8878,8878,8904,8791,8853,9003,9253,9306,9152,9069,8872,8790,8687,26,-113,62,150,250,53,-154,-83,-197,-82,-103,26,110,106,100,108,128,98,112,93,99,93,16,97,103,107,107,98,87,87,112,93,105,10,13,3,-7,1,30,11,25,-19,6,-12,0,4,4,9,11,13,8,4,5,4,4,16,-132,53,141,234,10,-174,-111,-184,-93,-94,16,-128,57,150,245,23,-166,-107,-179,-89,-90,0,2,2,7,4,0,1,-1,1,1,-1,1005,1005,1005,1005,1003,1003,1002,1001,998,996,996,997,12.432890647,12.015416005,11.200716846,11.831726556,13.793846651,10.618701918,12.293507491,10.367315088,11.210508436,10.642558792,10.963549025,11.675357062,11.984767025,11.722173532,10.560913842,9.4268068046,9.5494209977,12.485368709,10.531083682,12.015792184,1.4693416219,0.3400589436,-0.784050179,0.1095530237,3.2329328089,1.1918951132,2.7440864936,-2.11805362,0.6794247537,-1.373233392,0.4521051144,0.4534119247,1.0080645161,1.2050832603,1.4009375505,0.8668328096,0.439053839,0.5573825316,0.4529498358,0.4577444642,-14.91946878,6.0077080027,15.793010753,25.635407537,1.0776442696,-18.85361361,-12.18374403,-20.51167716,-10.53108368,-10.75699491,-14.46736366,6.4611199275,16.801075269,26.840490798,2.4785818201,-17.9867808,-11.74469019,-19.95429463,-10.07813385,-10.29925044 +050,3,7,40,153,Oklahoma,Woodward County,20081,20084,19996,20111,20677,21248,21544,21619,20991,20540,20277,20138,19812,-88,115,566,571,296,75,-628,-451,-263,-139,-326,63,292,317,340,308,315,304,273,252,256,254,25,187,186,183,175,185,186,217,202,231,288,38,105,131,157,133,130,118,56,50,25,-34,3,15,18,21,34,55,48,27,24,18,16,-139,-4,405,382,132,-108,-798,-536,-339,-181,-306,-136,11,423,403,166,-53,-750,-509,-315,-163,-290,10,-1,12,11,-3,-2,4,2,2,-1,-2,1240,1240,1240,1240,1240,1239,1237,1232,1231,1231,1231,1231,14.561049193,15.543787388,16.219439475,14.395214059,14.595834395,14.26895095,13.146806,12.347796261,12.668563652,12.715894869,9.3250554766,9.1203295087,8.7298747764,8.179098897,8.5721567083,8.7303449894,10.450025282,9.8978366857,11.431399233,14.418022528,5.2359937168,6.4234578798,7.4895646989,6.2161151617,6.0236776869,5.538605961,2.696780718,2.4499595757,1.2371644192,-1.70212766,0.7479991024,0.8826125331,1.0017889088,1.5890820714,2.5484790214,2.2529922553,1.3002335605,1.1759805963,0.8907583818,0.8010012516,-0.199466427,19.858781995,18.223017293,6.1693774537,-5.004286078,-37.45599625,-25.81204402,-16.61072592,-8.957070395,-15.31914894,0.5485326751,20.741394528,19.224806202,7.7584595251,-2.455807057,-35.20300399,-24.51181045,-15.43474533,-8.066312013,-14.51814768 +040,4,9,41,000,Oregon,Oregon,3831074,3831083,3837614,3872672,3900102,3924110,3965447,4018542,4093271,4147294,4183538,4216116,4241507,6531,35058,27430,24008,41337,53095,74729,54023,36244,32578,25391,11877,45391,44921,45000,45471,45669,45655,44612,42925,42172,42070,7823,32496,32947,33416,33805,35389,35336,36822,36329,36504,39735,4054,12895,11974,11584,11666,10280,10319,7790,6596,5668,2335,1710,10740,4676,3706,7240,5616,13081,8316,3592,2272,1908,986,11431,10901,8781,22264,36911,51130,37826,26053,24649,21128,2696,22171,15577,12487,29504,42527,64211,46142,29645,26921,23036,-219,-8,-121,-63,167,288,199,91,3,-11,20,86642,86645,86793,87739,86354,86923,87503,88798,88589,89131,88625,88649,11.774141711,11.558550397,11.502755805,11.526882942,11.440146022,11.256423194,10.827412926,10.305093177,10.04136599,9.9484216783,8.4292593037,8.4775396789,8.5416908438,8.5695559332,8.8649921737,8.7122323949,8.936765865,8.7215778688,8.6917865903,9.3962570807,3.3448824077,3.0810107177,2.9610649609,2.9573270083,2.5751538485,2.5441907993,1.8906470612,1.583515308,1.3495793993,0.5521645975,2.7858888762,1.2031740534,0.9473158447,1.8353375228,1.4068155655,3.2251729669,2.0183082107,0.8623388396,0.540974664,0.4511906005,2.9651299576,2.8049188102,2.2445710827,5.6439163821,9.246255224,12.606306383,9.1804384772,6.2545973799,5.8690512728,4.9962028338,5.7510188338,4.0080928636,3.1918869274,7.4792539049,10.65307079,15.83147935,11.198746688,7.1169362196,6.4100259368,5.4473934343 +050,4,9,41,001,Oregon,Baker County,16134,16138,16116,16069,16001,16027,16030,15899,15971,16049,16024,16123,16284,-22,-47,-68,26,3,-131,72,78,-25,99,161,44,172,183,164,174,157,141,163,158,162,160,42,210,202,192,206,215,216,207,201,213,231,2,-38,-19,-28,-32,-58,-75,-44,-43,-51,-71,0,7,9,10,9,12,12,9,6,3,5,-22,-16,-54,45,29,-83,135,113,15,149,230,-22,-9,-45,55,38,-71,147,122,21,152,235,-2,0,-4,-1,-3,-2,0,0,-3,-2,-3,373,373,373,391,410,438,431,429,393,395,368,368,10.688208793,11.41253508,10.241039091,10.85566335,9.8343198973,8.8484468152,10.18113679,9.8525239298,10.078700967,9.8744098497,13.049557247,12.597443093,11.989509179,12.852107184,13.467380751,13.555067462,12.929419113,12.533907025,13.251625346,14.256179221,-2.361348454,-1.184908014,-1.748470089,-1.996443834,-3.633060854,-4.706620646,-2.748282324,-2.681383095,-3.172924379,-4.381769371,0.4349852416,0.561272217,0.6244536031,0.5614998284,0.7516677628,0.7530593034,0.5621486571,0.3741464783,0.1866426105,0.3085753078,-0.994251981,-3.367633302,2.8100412139,1.8092772249,-5.19903536,8.4719171635,7.0580886946,0.9353661959,9.2699163219,14.194464159,-0.559266739,-2.806361085,3.434494817,2.3707770534,-4.447367597,9.2249764669,7.6202373517,1.3095126742,9.4565589324,14.503039467 +050,4,9,41,003,Oregon,Benton County,85579,85581,85577,86281,86708,86228,87296,88443,90053,91923,92511,93114,93239,-4,704,427,-480,1068,1147,1610,1870,588,603,125,194,762,733,715,720,718,758,743,671,686,678,100,549,570,546,551,575,599,599,554,600,650,94,213,163,169,169,143,159,144,117,86,28,99,614,434,352,521,498,958,557,314,238,204,-207,-124,-159,-1029,381,510,495,1163,162,277,-111,-108,490,275,-677,902,1008,1453,1720,476,515,93,10,1,-11,28,-3,-4,-2,6,-5,2,4,5032,5033,5007,4979,4457,5119,5099,5133,5323,5642,5817,5819,8.8677861956,8.4745272821,8.2689549891,8.2985638874,8.1712084398,8.4931875224,8.1659119884,7.2763156468,7.3912457912,7.2765128546,6.3889955661,6.590014394,6.314474719,6.3507065305,6.5437950597,6.7116349946,6.583285708,6.0075691033,6.4646464646,6.976007899,2.4787906295,1.8845128881,1.9544802702,1.9478573569,1.6274133801,1.7815525278,1.5826262804,1.2687465435,0.9265993266,0.3005049556,7.1454340211,5.0176600824,4.0708701485,6.0049330352,5.6674955474,10.734134098,6.1216863762,3.405012091,2.5643097643,2.1893932483,-1.443051822,-1.838267173,-11.9003562,4.3913233904,5.8040617051,5.5463427752,12.781905306,1.7567259833,2.9845117845,-1.191287503,5.7023821993,3.1793929094,-7.829486053,10.396256426,11.471557253,16.280476873,18.903591682,5.1617380743,5.5488215488,0.9981057455 +050,4,9,41,005,Oregon,Clackamas County,375992,375991,376799,379640,383159,387571,393544,399852,407055,412982,415586,418199,421596,808,2841,3519,4412,5973,6308,7203,5927,2604,2613,3397,1015,3809,3883,4034,3962,4119,4262,4181,4028,3904,3864,721,3074,2953,3205,3119,3424,3423,3546,3416,3436,3871,294,735,930,829,843,695,839,635,612,468,-7,123,585,147,66,260,138,723,434,167,87,75,424,1533,2468,3499,4806,5444,5636,4861,1841,2062,3339,547,2118,2615,3565,5066,5582,6359,5295,2008,2149,3414,-33,-12,-26,18,64,31,5,-3,-16,-4,-10,2753,2753,2796,2836,2946,2934,2934,2967,2913,2918,2913,2915,10.070871544,10.180925775,10.467997872,10.144472965,10.383213427,10.563794836,10.197100863,9.722798853,9.3645244278,9.2022457862,8.1275555597,7.7425376803,8.3167905752,7.9860199843,8.6312509768,8.4842491142,8.6483902556,8.2455513609,8.2419328724,9.2189165213,1.9433159845,2.4383880944,2.151207297,2.1584529807,1.75196245,2.0795457221,1.548710607,1.4772474921,1.1225915554,-0.016670735,1.5467208856,0.3854226343,0.1712662022,0.6657150356,0.3478716807,1.7920280776,1.0584888243,0.4031051163,0.2086868917,0.1786150191,4.0532019105,6.4709051795,9.0797036576,12.305486388,13.723285724,13.969391764,11.855562615,4.4438114916,4.9461192034,7.9519406522,5.5999227962,6.8563278137,9.2509698597,12.971201424,14.071157404,15.761419841,12.914051439,4.8469166079,5.1548060951,8.1305556713 +050,4,9,41,007,Oregon,Clatsop County,37039,37034,37097,37241,37435,37143,37491,37848,38732,39185,39730,40208,40423,63,144,194,-292,348,357,884,453,545,478,215,118,418,430,416,415,425,411,411,360,384,373,73,358,365,428,382,420,378,428,410,386,435,45,60,65,-12,33,5,33,-17,-50,-2,-62,13,51,53,13,20,13,27,24,5,7,6,8,34,78,-295,293,339,819,445,589,474,271,21,85,131,-282,313,352,846,469,594,481,277,-3,-1,-2,2,2,0,5,1,1,-1,0,956,956,994,1001,893,891,868,903,838,845,860,859,11.245930749,11.516417591,11.156105018,11.120936838,11.282337169,10.733873074,10.549687488,9.1237407337,9.6074457705,9.2520246555,9.6316823159,9.7755637688,11.477915739,10.236621379,11.149603791,9.8720292505,10.986049258,10.390926947,9.6574845505,10.789894706,1.6142484328,1.7408538218,-0.321810722,0.8843154594,0.1327333785,0.8618438235,-0.43636177,-1.267186213,-0.05003878,-1.53787005,1.3721111679,1.419465424,0.3486282818,0.5359487633,0.345106784,0.7051449465,0.6160401453,0.1267186213,0.1751357302,0.1488261339,0.9147407786,2.0890245862,-7.911180241,7.8516493823,8.9993230598,21.389396709,11.422411027,14.927453589,11.859190873,6.7219803798,2.2868519465,3.5084900102,-7.562551959,8.3875981456,9.3444298438,22.094541656,12.038451172,15.054172211,12.034326603,6.8708065136 +050,4,9,41,009,Oregon,Columbia County,49351,49350,49353,49408,49220,49271,49513,49671,50939,51749,52408,52614,52876,3,55,-188,51,242,158,1268,810,659,206,262,125,499,444,481,507,535,542,490,505,464,466,75,389,429,364,440,459,469,468,459,480,533,50,110,15,117,67,76,73,22,46,-16,-67,10,38,3,4,16,16,12,9,-7,-8,-1,-59,-92,-210,-71,164,72,1177,776,619,230,333,-49,-54,-207,-67,180,88,1189,785,612,222,332,2,-1,4,1,-5,-6,6,3,1,0,-3,499,499,497,461,371,392,460,481,461,456,466,465,10.105203471,9.0035284098,9.7673899138,10.264820214,10.788030327,10.774276911,9.5434714864,9.6968998723,8.8362438346,8.8349606598,7.8776035075,8.6993551527,7.3915383131,8.9083252349,9.2555250847,9.3231289136,9.1149890932,8.8136179037,9.1409418979,10.105223244,2.2275999635,0.3041732571,2.3758516007,1.3564949789,1.5325052428,1.4511479972,0.4284823933,0.8832819686,-0.304698063,-1.270262584,0.7695345329,0.0608346514,0.0812256957,0.3239390994,0.3226326827,0.2385448763,0.1752882518,-0.134412473,-0.152349032,-0.018959143,-1.863083606,-4.258425599,-1.4417561,3.3203757694,1.4518470721,23.397276613,15.113742599,11.885903012,4.3800346594,6.3133946346,-1.093549073,-4.197590948,-1.360530404,3.6443148688,1.7744797548,23.635821489,15.289030851,11.751490538,4.2276856278,6.2944354915 +050,4,9,41,011,Oregon,Coos County,63043,63055,63010,62789,62697,62409,62403,62696,63386,63764,64338,64677,64711,-45,-221,-92,-288,-6,293,690,378,574,339,34,168,607,586,650,638,609,641,593,587,582,570,240,833,881,831,860,906,890,932,982,905,999,-72,-226,-295,-181,-222,-297,-249,-339,-395,-323,-429,1,53,56,38,45,6,0,4,-4,-7,-5,34,-45,148,-134,180,586,936,714,969,670,471,35,8,204,-96,225,592,936,718,965,663,466,-8,-3,-1,-11,-9,-2,3,-1,4,-1,-3,1019,1019,994,1185,1237,1188,1160,1244,1229,1228,1185,1188,9.6503151853,9.3396872958,10.391188272,10.223375957,9.7362888592,10.167985914,9.3275658671,9.1645719817,9.0222067201,8.8107088756,13.243348516,14.04140701,13.284734545,13.780726212,14.484528254,14.117796355,14.65985057,15.331532685,14.029376429,15.441926608,-3.593033331,-4.701719714,-2.893546273,-3.557350255,-4.748239394,-3.949810441,-5.332284703,-6.166960703,-5.007169709,-6.631217733,0.8426140112,0.892529844,0.6074848528,0.7210845111,0.0959240282,0,0.0629178136,-0.062450235,-0.108514514,-0.07728692,-0.715426991,2.3588288733,-2.142183428,2.8843380444,9.3685800846,14.847480211,11.230829729,15.128569421,10.38638918,7.2804278604,0.1271870206,3.2513587173,-1.534698576,3.6054225555,9.4645041127,14.847480211,11.293747542,15.066119186,10.277874666,7.2031409404 +050,4,9,41,013,Oregon,Crook County,20978,20978,20882,20640,20610,20702,20965,21465,22310,23072,23789,24388,25105,-96,-242,-30,92,263,500,845,762,717,599,717,54,156,163,190,194,224,221,261,254,234,237,40,240,208,238,230,275,248,272,286,253,266,14,-84,-45,-48,-36,-51,-27,-11,-32,-19,-29,1,9,0,2,-4,-8,-10,-9,-9,-9,-5,-117,-167,21,136,296,552,877,778,755,628,757,-116,-158,21,138,292,544,867,769,746,619,752,6,0,-6,2,7,7,5,4,3,-1,-6,245,245,244,228,226,239,244,246,246,261,229,229,7.5140889167,7.903030303,9.1982958947,9.3119255046,10.558567052,10.097087379,11.502357763,10.840571051,9.7141789651,9.5771119148,11.560136795,10.084848485,11.52207591,11.039911681,12.962526514,11.33066819,11.987131462,12.206312285,10.502937086,10.748994807,-4.046047878,-2.181818182,-2.323780015,-1.727986176,-2.403959463,-1.233580811,-0.484773699,-1.365741235,-0.788758121,-1.171882893,0.4335051298,0,0.0968241673,-0.191998464,-0.37709168,-0.456881782,-0.396633026,-0.384114722,-0.373622268,-0.202048775,-8.04392852,1.0181818182,6.5840433772,14.207886337,26.019325949,40.068532267,34.286721608,32.222957257,26.070531581,30.590184471,-7.61042339,1.0181818182,6.6808675445,14.015887873,25.642234268,39.611650485,33.890088581,31.838842534,25.696909314,30.388135696 +050,4,9,41,015,Oregon,Curry County,22364,22364,22378,22497,22272,22252,22167,22329,22629,22681,22850,22981,23305,14,119,-225,-20,-85,162,300,52,169,131,324,51,181,191,179,177,175,165,182,168,172,169,77,342,350,370,386,386,402,408,328,376,403,-26,-161,-159,-191,-209,-211,-237,-226,-160,-204,-234,3,-7,-16,-15,-16,-19,-13,-13,-16,-16,-11,37,287,-44,181,141,386,548,289,344,352,572,40,280,-60,166,125,367,535,276,328,336,561,0,0,-6,5,-1,6,2,2,1,-1,-3,318,318,318,314,317,312,303,301,303,304,304,304,8.0668523677,8.532690031,8.0406073129,7.9695625746,7.8658755843,7.3401841719,8.0335466784,7.3795875338,7.5058366608,7.3024240591,15.242339833,15.635819429,16.620249753,17.379950021,17.349874146,17.883357801,18.009269477,14.407766137,16.408108049,17.413472756,-7.175487465,-7.103129398,-8.57964244,-9.410387447,-9.483998562,-10.54317363,-9.975722798,-7.028178604,-8.902271388,-10.1110487,-0.311977716,-0.714780317,-0.673793909,-0.720412436,-0.854009349,-0.578317541,-0.573824763,-0.70281786,-0.698217364,-0.475305708,12.791086351,-1.965645871,8.1304465008,6.3486345933,17.349874146,24.378308644,12.756565879,15.110583998,15.360782003,24.715896815,12.479108635,-2.680426188,7.4566525919,5.6282221572,16.495864797,23.799991103,12.182741117,14.407766137,14.66256464,24.240591107 +050,4,9,41,017,Oregon,Deschutes County,157733,157728,157744,159683,161408,165385,169631,174392,180819,186971,191770,197417,201769,16,1939,1725,3977,4246,4761,6427,6152,4799,5647,4352,421,1708,1666,1700,1750,1813,1737,1813,1853,1798,1866,371,1216,1307,1332,1340,1401,1451,1541,1500,1511,1674,50,492,359,368,410,412,286,272,353,287,192,0,-11,-35,-9,24,-12,86,18,-43,-61,-52,-16,1455,1390,3543,3693,4295,6017,5818,4463,5427,4235,-16,1444,1355,3534,3717,4283,6103,5836,4420,5366,4183,-18,3,11,75,119,66,38,44,26,-6,-23,1244,1244,1048,1033,1209,1101,1090,1340,1402,1382,1377,1378,10.761529423,10.377120505,10.404139624,10.44726222,10.539992966,9.7801025306,9.8588868648,9.7850509979,9.239774196,9.3490252664,7.6616040853,8.1409942976,8.1519493992,7.9996179287,8.1448042718,8.1697920391,8.3797819408,7.9209803005,7.7649047887,8.3870676827,3.0999253372,2.2361262072,2.2521902244,2.4476442916,2.3951886938,1.6103104915,1.479104924,1.8640706974,1.4748694073,0.9619575837,-0.069307274,-0.218006733,-0.055080739,0.143276739,-0.069762777,0.4842192387,0.0978819435,-0.227068102,-0.313473986,-0.260530179,9.1674621252,8.6579816937,21.683450992,22.046708217,24.969260776,33.878455341,31.637619294,23.567556721,27.888906875,21.218178994,9.0981548514,8.4399749604,21.628370253,22.189984956,24.899497999,34.362674579,31.735501237,23.340488619,27.57543289,20.957648815 +050,4,9,41,019,Oregon,Douglas County,107667,107684,107637,107257,106955,106645,106769,107260,108244,109378,110164,110926,111364,-47,-380,-302,-310,124,491,984,1134,786,762,438,266,1072,1080,1114,1063,1117,1079,1098,1061,1049,1048,369,1402,1403,1309,1428,1405,1461,1516,1497,1547,1592,-103,-330,-323,-195,-365,-288,-382,-418,-436,-498,-544,11,36,0,4,33,0,74,36,-1,-9,-6,60,-78,41,-101,476,783,1292,1515,1229,1273,994,71,-42,41,-97,509,783,1366,1551,1228,1264,988,-15,-8,-20,-18,-20,-4,0,1,-6,-4,-6,1708,1707,1650,1738,1715,1820,1740,1885,1817,1822,1837,1836,9.9770119222,10.083468713,10.43071161,9.9618581724,10.437837863,10.013735244,10.090891546,9.6655765184,9.4893482292,9.4291241171,13.048293577,13.099172782,12.256554307,13.382439765,13.12906195,13.55891306,13.932414921,13.637481666,13.994300963,14.323631292,-3.071281655,-3.015704069,-1.825842697,-3.420581593,-2.691224086,-3.545177816,-3.841523375,-3.971905148,-4.504952734,-4.894507175,0.3350489078,0,0.0374531835,0.3092580618,0,0.6867621947,0.3308489031,-0.009109874,-0.081414808,-0.053983535,-0.7259393,0.3827983493,-0.945692884,4.460813255,7.3167654851,11.990496696,13.923224674,11.196035383,11.515672351,8.9432723019,-0.390890392,0.3827983493,-0.9082397,4.7700713168,7.3167654851,12.677258891,14.254073577,11.186925509,11.434257542,8.8892887669 +050,4,9,41,021,Oregon,Gilliam County,1871,1871,1880,1950,1949,1940,1927,1866,1852,1860,1883,1911,1975,9,70,-1,-9,-13,-61,-14,8,23,28,64,6,18,17,23,18,18,14,18,12,18,14,0,18,24,20,15,22,26,16,21,19,21,6,0,-7,3,3,-4,-12,2,-9,-1,-7,0,0,1,1,0,1,1,1,1,1,0,3,69,5,-12,-18,-58,-2,4,32,29,71,3,69,6,-11,-18,-57,-1,5,33,30,71,0,1,0,-1,2,0,-1,1,-1,-1,0,20,20,21,21,21,21,21,26,28,22,18,18,9.3994778068,8.7201846627,11.828233479,9.3095422808,9.4911679409,7.5309306079,9.6982758621,6.4119690088,9.4886663152,7.2053525476,9.3994778068,12.310848936,10.285420417,7.7579519007,11.600316372,13.986013986,8.6206896552,11.220945765,10.015814444,10.808028821,0,-3.590664273,1.5428130625,1.5515903801,-2.109148431,-6.455083378,1.0775862069,-4.808976757,-0.527148129,-3.602676274,0,0.512952039,0.5142710208,0,0.5272871078,0.5379236148,0.5387931034,0.5343307507,0.5271481286,0,36.031331593,2.5647601949,-6.17125225,-9.309542281,-30.58265225,-1.07584723,2.1551724138,17.098584024,15.28729573,36.541430777,36.031331593,3.0777122339,-5.656981229,-9.309542281,-30.05536515,-0.537923615,2.6939655172,17.632914774,15.814443859,36.541430777 +050,4,9,41,023,Oregon,Grant County,7445,7444,7465,7409,7325,7271,7191,7209,7167,7190,7169,7166,7180,21,-56,-84,-54,-80,18,-42,23,-21,-3,14,19,65,61,61,57,70,57,63,58,62,59,16,82,86,84,75,81,93,76,102,95,89,3,-17,-25,-23,-18,-11,-36,-13,-44,-33,-30,0,2,0,0,0,-2,-1,-2,-2,-2,-2,18,-42,-59,-31,-64,31,-4,40,24,33,46,18,-40,-59,-31,-64,29,-5,38,22,31,44,0,1,0,0,2,0,-1,-2,1,-1,0,105,105,95,95,95,95,109,109,121,127,126,126,8.7400833669,8.2801683182,8.3584543711,7.882727147,9.7222222222,7.9298831386,8.7762067284,8.0785570026,8.6501569585,8.2252892792,11.025951324,11.673679924,11.51000274,10.372009404,11.25,12.938230384,10.587170022,14.207117487,13.254272759,12.40763976,-2.285867958,-3.393511606,-3.151548369,-2.489282257,-1.527777778,-5.008347245,-1.810963293,-6.128560485,-4.6041158,-4.182350481,0.2689256421,0,0,0,-0.277777778,-0.139120757,-0.278609737,-0.278570931,-0.279037321,-0.278823365,-5.647438483,-8.00868739,-4.247739107,-8.850781358,4.3055555556,-0.556483027,5.5721947482,3.3428511735,4.6041158005,6.4129374042,-5.378512841,-8.00868739,-4.247739107,-8.850781358,4.0277777778,-0.695603784,5.2935850108,3.0642802424,4.3250784792,6.1341140388 +050,4,9,41,025,Oregon,Harney County,7422,7422,7403,7363,7256,7167,7133,7154,7252,7270,7278,7375,7373,-19,-40,-107,-89,-34,21,98,18,8,97,-2,30,78,79,74,78,94,80,75,73,66,63,33,95,65,86,77,99,95,78,74,84,83,-3,-17,14,-12,1,-5,-15,-3,-1,-18,-20,0,-2,5,6,14,4,5,6,5,5,3,-16,-20,-130,-85,-51,23,109,16,4,110,16,-16,-22,-125,-79,-37,27,114,22,9,115,19,0,-1,4,2,2,-1,-1,-1,0,0,-1,127,127,141,154,154,155,139,149,148,149,156,155,10.564811052,10.807852794,10.261388061,10.909090909,13.158815707,11.10648341,10.329155764,10.035743745,9.0083941855,8.5435313263,12.867398077,8.8925371092,11.925396935,10.769230769,13.858752712,13.188949049,10.742321994,10.173219687,11.465228963,11.255763493,-2.302587024,1.9153156851,-1.664008875,0.1398601399,-0.699937006,-2.082465639,-0.413166231,-0.137475942,-2.456834778,-2.712232167,-0.270892591,0.6840413161,0.8320044374,1.958041958,0.5599496045,0.6941552131,0.8263324611,0.6873797086,0.682454105,0.4068348251,-2.708925911,-17.78507422,-11.78672953,-7.132867133,3.2197102261,15.132583646,2.2035532296,0.5499037668,15.013990309,2.1697857337,-2.979818502,-17.1010329,-10.95472509,-5.174825175,3.7796598306,15.826738859,3.0298856907,1.2372834754,15.696444414,2.5766205587 +050,4,9,41,027,Oregon,Hood River County,22346,22346,22447,22439,22545,22574,22671,22925,23090,23405,23228,23347,23280,101,-8,106,29,97,254,165,315,-177,119,-67,67,289,285,292,270,297,294,248,256,247,250,19,168,189,169,203,184,162,194,205,167,179,48,121,96,123,67,113,132,54,51,80,71,8,18,-37,-30,14,-10,11,53,2,-2,-2,45,-147,49,-60,19,150,24,209,-231,41,-137,53,-129,12,-90,33,140,35,262,-229,39,-139,0,0,-2,-4,-3,1,-2,-1,1,0,1,787,787,771,785,784,785,789,780,789,790,791,791,12.877066346,12.671171972,12.943549281,11.935020444,13.027458549,12.778441812,10.667813743,10.979349388,10.606548578,10.723400605,7.4856302633,8.402987729,7.4913007824,8.9733672229,8.0708834108,7.0411822232,8.3449833315,8.7920571269,7.1712292002,7.677954833,5.3914360825,4.2681842433,5.4522484984,2.9616532214,4.9565751382,5.7372595893,2.3228304119,2.1872922608,3.4353193773,3.0454457718,0.8020318139,-1.645029344,-1.329816707,0.6188529119,-0.438634968,0.4781049658,2.2798150339,0.0857761671,-0.085882984,-0.085787205,-6.54992648,2.1785523742,-2.659633414,0.839871809,6.5795245197,1.0431381071,8.9902140015,-9.907147299,1.7606011809,-5.876423531,-5.747894666,0.5335230304,-3.989450121,1.458724721,6.1408895517,1.5212430729,11.270029035,-9.821371132,1.6747181965,-5.962210736 +050,4,9,41,029,Oregon,Jackson County,203206,203206,203357,204798,205939,207313,209351,211587,214600,217030,219616,220815,221844,151,1441,1141,1374,2038,2236,3013,2430,2586,1199,1029,574,2408,2254,2283,2345,2319,2341,2297,2211,2203,2159,541,2188,2212,2255,2314,2291,2313,2450,2425,2369,2524,33,220,42,28,31,28,28,-153,-214,-166,-365,21,153,-60,-75,0,-29,111,114,-15,-34,-30,121,1072,1168,1425,1984,2229,2868,2466,2810,1405,1426,142,1225,1108,1350,1984,2200,2979,2580,2795,1371,1396,-24,-4,-9,-4,23,8,6,3,5,-6,-2,3492,3492,3573,3606,3485,3569,3750,3788,3630,3667,3482,3484,11.799438939,10.975393013,11.048948341,11.256072039,11.018249718,10.985787929,10.643375113,10.12719686,10.00383715,9.7546870164,10.721417109,10.770882584,10.913437806,11.107271087,10.885213499,10.854390209,11.352315641,11.107395923,10.757644217,11.403811964,1.0780218299,0.2045104288,0.1355105359,0.1488009523,0.1330362191,0.1313977198,-0.708940528,-0.980199063,-0.753807066,-1.649124947,0.7497151817,-0.292157755,-0.36297465,0,-0.137787513,0.5208981034,0.5282301972,-0.068705542,-0.154394218,-0.135544516,5.2529063714,5.6873376394,6.8965183472,9.5232609489,10.5906333,13.458880726,11.426453212,12.870838162,6.3801140247,6.4428826704,6.0026215531,5.395179884,6.5335436973,9.5232609489,10.452845787,13.979778829,11.954683409,12.80213262,6.2257198063,6.3073381542 +050,4,9,41,031,Oregon,Jefferson County,21720,21725,21662,21752,21835,21869,22200,22540,23022,23629,24085,24647,24856,-63,90,83,34,331,340,482,607,456,562,209,69,312,288,278,280,290,281,279,249,324,310,55,204,180,199,213,218,217,203,197,208,274,14,108,108,79,67,72,64,76,52,116,36,4,18,7,2,-9,-8,-16,-12,-13,-13,-10,-83,-35,-27,-45,268,271,433,542,414,460,184,-79,-17,-20,-43,259,263,417,530,401,447,174,2,-1,-5,-2,5,5,1,1,3,-1,-1,853,853,897,904,896,889,901,947,944,943,944,943,14.373243654,13.214949412,12.721947648,12.707345299,12.963790791,12.334840437,11.961158389,10.437188247,13.297217434,12.524493465,9.3978900815,8.2593433822,9.1067179206,9.6666591028,9.7451944569,9.5254817611,8.7029216951,8.2575344763,8.5364852664,11.070036159,4.9753535726,4.9556060293,3.6152297273,3.0406861966,3.2185963344,2.8093586761,3.2582366937,2.1796537704,4.7607321678,1.4544573056,0.8292255954,0.3211966871,0.0915248032,-0.408450385,-0.357621815,-0.702339669,-0.514458425,-0.544913443,-0.533530329,-0.404015918,-1.612383102,-1.238901507,-2.059308072,12.162744787,12.114438981,19.007067293,23.236372211,17.353397326,18.878765493,7.4338928954,-0.783157507,-0.91770482,-1.967783269,11.754294402,11.756817166,18.304727624,22.721913785,16.808483883,18.345235164,7.0298769772 +050,4,9,41,033,Oregon,Josephine County,82713,82718,82880,82722,82789,83175,83435,84606,85599,86732,87418,87679,88053,162,-158,67,386,260,1171,993,1133,686,261,374,216,781,778,821,863,881,846,881,866,797,803,232,1211,1158,1179,1181,1199,1191,1269,1215,1253,1293,-16,-430,-380,-358,-318,-318,-345,-388,-349,-456,-490,7,7,-19,-16,-7,12,45,19,-8,-17,-16,171,272,472,755,583,1465,1292,1499,1042,739,885,178,279,453,739,576,1477,1337,1518,1034,722,869,0,-7,-6,5,2,12,1,3,1,-5,-5,1601,1601,1601,1541,1544,1547,1613,1577,1635,1587,1614,1615,9.4322532337,9.4011878365,9.8937118893,10.359522238,10.485536268,9.940953556,10.22450981,9.9454493253,9.1035254745,9.1389160768,14.625427229,13.993027654,14.207900509,14.176820119,14.270326885,13.994888517,14.727472132,13.953488372,14.312067026,14.715589648,-5.193173995,-4.591839817,-4.314188619,-3.817297881,-3.784790617,-4.053934961,-4.502962323,-4.008039047,-5.208541551,-5.576673571,0.0845400418,-0.229591991,-0.192812899,-0.08402857,0.1428222874,0.5287741253,0.2205058869,-0.091874821,-0.194178084,-0.182095464,3.2849844809,5.7035484046,9.0983586802,6.998379449,17.436220922,15.181692665,17.396753921,11.966695378,8.4410355403,10.072155327,3.3695245227,5.4739564138,8.905545781,6.9143508793,17.57904321,15.71046679,17.617259808,11.874820557,8.2468574562,9.8900598639 +050,4,9,41,035,Oregon,Klamath County,66380,66383,66323,66322,65936,65719,65333,65742,66287,66853,67810,68343,68739,-60,-1,-386,-217,-386,409,545,566,957,533,396,226,812,794,777,772,818,842,775,783,758,771,205,695,758,697,744,752,767,842,826,849,894,21,117,36,80,28,66,75,-67,-43,-91,-123,7,34,14,18,9,15,16,18,-12,-19,-10,-85,-148,-429,-309,-422,333,457,612,1011,644,530,-78,-114,-415,-291,-413,348,473,630,999,625,520,-3,-4,-7,-6,-1,-5,-3,3,1,-1,-1,950,950,979,1054,969,1003,978,1007,1033,1163,1193,1193,12.243205549,12.006835125,11.803577532,11.781582883,12.481403776,12.754773572,11.641880727,11.629029503,11.134532474,11.248741629,10.479098345,11.462444616,10.588279974,11.354271587,11.474346748,11.618659537,12.648340093,12.267660753,12.471263946,13.043287959,1.7641072034,0.5443905095,1.215297558,0.4273112963,1.0070570284,1.1361140356,-1.006459366,-0.63863125,-1.336731471,-1.79454633,0.5126465378,0.2117074203,0.2734419506,0.1373500595,0.2288765974,0.2423709943,0.2703920685,-0.178222674,-0.27909778,-0.145898076,-2.231520223,-6.487320238,-4.694086818,-6.44019168,5.0810604616,6.9227215233,9.193330329,15.015260316,9.4599457963,7.732598007,-1.718873685,-6.275612817,-4.420644867,-6.30284162,5.3099370589,7.1650925176,9.4637223975,14.837037642,9.1808480166,7.5866999314 +050,4,9,41,037,Oregon,Lake County,7895,7885,7875,7908,7789,7800,7828,7789,7837,7892,7861,7939,7949,-10,33,-119,11,28,-39,48,55,-31,78,10,16,67,68,80,83,84,75,74,52,72,71,16,83,76,82,89,98,108,83,101,93,107,0,-16,-8,-2,-6,-14,-33,-9,-49,-21,-36,0,1,1,-2,6,1,4,4,3,1,0,-9,47,-114,17,29,-25,78,61,14,99,46,-9,48,-113,15,35,-24,82,65,17,100,46,-1,1,2,-2,-1,-1,-1,-1,1,-1,0,454,454,454,454,465,461,467,470,469,470,468,469,8.4901476272,8.6640759381,10.263647444,10.621960584,10.757507844,9.5993856393,9.4093712251,6.6019170952,9.1139240506,8.9375629406,10.517645568,9.6833789896,10.52023863,11.389813156,12.550425818,13.823115321,10.553754212,12.822954358,11.772151899,13.469284995,-2.027497941,-1.019303052,-0.256591186,-0.767852572,-1.792917974,-4.223729681,-1.144382987,-6.221037263,-2.658227848,-4.531722054,0.1267186213,0.1274128814,-0.256591186,0.7678525723,0.1280655696,0.5119672341,0.5086146608,0.3808798324,0.1265822785,0,5.9557752012,-14.52506848,2.1810250818,3.7112874328,-3.201639239,9.9833610649,7.7563735775,1.7774392179,12.53164557,5.7905337362,6.0824938225,-14.3976556,1.9244338957,4.4791400051,-3.07357367,10.495328299,8.2649882383,2.1583190503,12.658227848,5.7905337362 +050,4,9,41,039,Oregon,Lane County,351715,351705,351948,354119,355217,355654,358273,362257,369201,375689,378807,382064,382986,243,2171,1098,437,2619,3984,6944,6488,3118,3257,922,950,3470,3480,3452,3642,3710,3519,3488,3361,3364,3314,729,3123,3410,3310,3384,3527,3508,3649,3667,3829,4016,221,347,70,142,258,183,11,-161,-306,-465,-702,185,1162,562,300,667,487,1065,570,259,168,137,-120,674,539,62,1732,3297,5844,6048,3161,3554,1470,65,1836,1101,362,2399,3784,6909,6618,3420,3722,1607,-43,-12,-73,-67,-38,17,24,31,4,0,17,8530,8529,8504,8783,8191,8167,8254,8330,8791,8657,8799,8800,9.8290955391,9.811993188,9.7120293274,10.202723808,10.297975102,9.6218784947,9.3651411618,8.9092586309,8.8424976113,8.6634860467,8.8461859852,9.6146255089,9.3125194304,9.4799608363,9.7900156829,9.5918015799,9.7974197533,9.720396132,10.064781021,10.498660218,0.9829095539,0.1973676791,0.399509897,0.7227629716,0.5079594188,0.0300769149,-0.432278591,-0.811137501,-1.222283409,-1.835174172,3.291472339,1.5845805091,0.8440349937,1.86853838,1.3517827155,2.9119922128,1.5304273114,0.6865510221,0.4415991673,0.3581465264,1.9091672603,1.5197311288,0.1744338987,4.8520366928,9.1515967413,15.979044593,16.238639262,8.3791034015,9.3419252409,3.8428860859,5.2006395994,3.1043116379,1.0184688924,6.7205750728,10.503379457,18.891036806,17.769066574,9.0656544236,9.7835244082,4.2010326122 +050,4,9,41,041,Oregon,Lincoln County,46034,46033,45997,45877,46180,46351,46383,47046,47855,48794,49320,50125,50583,-36,-120,303,171,32,663,809,939,526,805,458,112,437,418,439,448,424,451,405,388,381,386,174,589,568,559,563,546,590,611,642,618,690,-62,-152,-150,-120,-115,-122,-139,-206,-254,-237,-304,6,44,15,32,49,17,8,14,6,-6,-3,24,-11,418,255,101,760,938,1123,770,1050,769,30,33,433,287,150,777,946,1137,776,1044,766,-4,-1,20,4,-3,8,2,8,4,-2,-4,762,761,770,826,811,767,810,810,821,839,856,857,9.5130287132,9.0813300455,9.4887118911,9.6620441262,9.0764109645,9.5046416792,8.380842016,7.9091668875,7.662527025,7.6657266553,12.821908266,12.34018054,12.082437237,12.142256346,11.68801978,12.434010179,12.643690054,13.086817376,12.428980844,13.702982881,-3.308879552,-3.258850495,-2.593725346,-2.48021222,-2.611608815,-2.9293685,-4.262848038,-5.177650488,-4.766453819,-6.037256226,0.9578335547,0.3258850495,0.6916600923,1.0567860763,0.3639127038,0.1685967482,0.2897081191,0.1223067044,-0.120669717,-0.059578186,-0.239458389,9.0813300455,5.5116663605,2.178273341,16.269038521,19.767968725,23.238729837,15.696027071,21.117200463,15.271875124,0.718375166,9.407215095,6.2033264528,3.2350594173,16.632951225,19.936565473,23.528437956,15.818333775,20.996530746,15.212296938 +050,4,9,41,043,Oregon,Linn County,116672,116681,116887,118175,118293,118439,119095,120303,122871,125098,127455,129598,131054,206,1288,118,146,656,1208,2568,2227,2357,2143,1456,385,1451,1446,1377,1452,1470,1543,1485,1486,1481,1498,260,1129,1125,1140,1218,1297,1328,1291,1307,1362,1472,125,322,321,237,234,173,215,194,179,119,26,18,73,-16,-27,10,14,96,48,5,-3,-4,73,891,-160,-43,421,1023,2248,1979,2161,2029,1437,91,964,-176,-70,431,1037,2344,2027,2166,2026,1433,-10,2,-27,-21,-9,-2,9,6,12,-2,-3,1227,1227,1249,1230,1185,1197,1221,1210,1098,1186,1170,1171,12.345679012,12.229984607,11.633408242,12.225618227,12.280804351,12.690501452,11.977303615,11.767826951,11.522915508,11.494252874,9.6059762956,9.5150295177,9.6311440785,10.255373968,10.83551241,10.922220303,10.412591897,10.350302709,10.597036409,11.294753157,2.7397027167,2.7149550891,2.0022641637,1.9702442598,1.4452919406,1.7682811485,1.564711718,1.4175242424,0.9258790989,0.1994997161,0.6211127277,-0.135324864,-0.228106044,0.0841984726,0.1169600414,0.7895580942,0.3871451673,0.0395956492,-0.02334149,-0.030692264,7.5809786354,-1.353248643,-0.363279996,3.5447556981,8.5464373136,18.488818706,15.961672628,17.113239597,15.78662766,11.026195847,8.2020913631,-1.488573507,-0.59138604,3.6289541708,8.663397355,19.2783768,16.348817796,17.152835246,15.763286171,10.995503583 +050,4,9,41,045,Oregon,Malheur County,31313,31316,31349,30964,30755,30642,30354,30228,30397,30449,30633,30698,30983,33,-385,-209,-113,-288,-126,169,52,184,65,285,137,442,402,455,429,388,462,415,393,398,383,54,319,295,281,328,315,298,316,306,278,269,83,123,107,174,101,73,164,99,87,120,114,4,-5,-30,-25,-7,-17,9,33,-3,-4,6,-56,-505,-288,-266,-390,-180,-3,-78,102,-53,166,-52,-510,-318,-291,-397,-197,6,-45,99,-57,172,2,2,2,4,8,-2,-1,-2,-2,2,-1,3351,3354,3351,3348,3368,3369,3316,3290,3305,3292,3269,3266,14.186445846,13.026782676,14.821571087,14.066496164,12.809085207,15.241237113,13.6409953,12.867948004,12.978754627,12.418735105,10.238633993,9.559454949,9.153541704,10.754803594,10.399128454,9.8309278351,10.386878349,10.019318293,9.0655622768,8.7222969796,3.9478118531,3.4673277273,5.6680293825,3.31169257,2.4099567528,5.4103092784,3.254116951,2.8486297109,3.9131923497,3.6964381252,-0.160480157,-0.972147961,-0.814372038,-0.229523247,-0.561222805,0.2969072165,1.0847056503,-0.098228611,-0.130439745,0.194549375,-16.20849582,-9.332620425,-8.664918481,-12.78772379,-5.942359117,-0.098969072,-2.563849719,3.3397727645,-1.728326621,5.3825327086,-16.36897598,-10.30476839,-9.479290519,-13.01724703,-6.503581922,0.1979381443,-1.479144069,3.2415441538,-1.858766366,5.5770820836 +050,4,9,41,047,Oregon,Marion County,315335,315342,315948,318053,319865,321491,324473,329106,335592,340846,345512,347557,349204,606,2105,1812,1626,2982,4633,6486,5254,4666,2045,1647,1202,4462,4329,4303,4338,4406,4482,4423,4372,4129,4119,626,2533,2573,2681,2573,2844,2798,2883,2907,2798,3161,576,1929,1756,1622,1765,1562,1684,1540,1465,1331,958,84,648,104,-12,141,3,507,503,125,31,46,-16,-460,33,76,1121,3053,4282,3205,3065,675,625,68,188,137,64,1262,3056,4789,3708,3190,706,671,-38,-12,-81,-60,-45,15,13,6,11,8,18,10429,10430,10295,10675,10694,10368,10936,10927,10683,10474,10475,10478,14.075687578,13.572277315,13.41844467,13.431089039,13.482685337,13.485823637,13.077325638,12.739707266,11.915119562,11.823279432,7.9905236743,8.0668675284,8.3604113784,7.9663882198,8.7028499998,8.4188608962,8.5240628114,8.4707980383,8.0742321472,9.0734125475,6.0851639035,5.5054097862,5.058033292,5.4647008192,4.7798353374,5.066962741,4.5532628267,4.2689092281,3.8408874153,2.7498668841,2.0441608136,0.3260607163,-0.037420715,0.436556836,0.0091802215,1.5255048157,1.4872020791,0.3642414017,0.0894571825,0.1320395372,-1.451101812,0.1034615734,0.2369978608,3.4707816535,9.3424054322,12.88404659,9.4761086751,8.9311991701,1.9478580055,1.7940154515,0.5930590015,0.4295222897,0.1995771459,3.9073384895,9.3515856538,14.409551405,10.963310754,9.2954405718,2.037315188,1.9260549887 +050,4,9,41,049,Oregon,Morrow County,11173,11175,11207,11226,11226,11197,11095,11130,11246,11225,11349,11607,11700,32,19,0,-29,-102,35,116,-21,124,258,93,38,183,155,141,149,165,176,156,159,171,167,26,72,76,85,84,66,84,72,74,83,101,12,111,79,56,65,99,92,84,85,88,66,14,48,0,-11,7,-5,28,49,23,23,16,6,-142,-80,-76,-181,-59,-4,-153,17,146,11,20,-94,-80,-87,-174,-64,24,-104,40,169,27,0,2,1,2,7,0,0,-1,-1,1,0,23,23,23,23,23,23,23,23,23,23,23,23,16.315249855,13.807233209,12.576372475,13.368024403,14.848143982,15.731140508,13.884562325,14.087002747,14.898065865,14.33045866,6.4191146971,6.7699982184,7.5815011372,7.5363359053,5.9392575928,7.5080443332,6.4082595345,6.5562151147,7.2312249521,8.6669241001,9.896135158,7.0372349902,4.9948713375,5.8316884981,8.9088863892,8.2230961745,7.4763027903,7.5307876318,7.6668409131,5.6635345604,4.2794097981,0,-0.981135441,0.6280279921,-0.449943757,2.5026814444,4.3611766277,2.0377425357,2.0038334205,1.3729780753,-12.65992065,-7.126313914,-6.778753958,-16.23900951,-5.309336333,-0.357525921,-13.61755151,1.5061575264,12.71998606,0.9439224267,-8.380510855,-7.126313914,-7.759889399,-15.61098152,-5.75928009,2.1451555238,-9.256374883,3.543900062,14.723819481,2.316900502 +050,4,9,41,051,Oregon,Multnomah County,735334,735152,737320,749926,760505,766977,779002,790723,803630,808192,809448,812439,815637,2168,12606,10579,6472,12025,11721,12907,4562,1256,2991,3198,2494,9587,9407,9324,9537,9463,9075,8766,8327,7993,8081,1285,5422,5391,5646,5555,5711,5610,5877,5703,5967,6509,1209,4165,4016,3678,3982,3752,3465,2889,2624,2026,1572,584,3975,2067,1954,3209,2650,4982,2931,1546,1106,872,336,4416,4302,816,4677,5221,4409,-1239,-2875,-146,742,920,8391,6369,2770,7886,7871,9391,1692,-1329,960,1614,39,50,194,24,157,98,51,-19,-39,5,12,19583,19582,19739,19737,19291,19613,19416,19427,19050,19088,19123,19129,12.892285473,12.456047314,12.208327169,12.337813127,12.056888946,11.383928151,10.877131594,10.295244925,9.8564203301,9.9270550023,7.291329074,7.1383598456,7.392558472,7.1863848086,7.2764337702,7.0373374027,7.2923685122,7.0510125862,7.3580958476,7.9959412214,5.6009563986,5.317687468,4.8157686965,5.1514283182,4.7804551753,4.3465907487,3.5847630818,3.2442323385,2.4983244825,1.9311137809,5.3454505845,2.7369671306,2.558458954,4.1514147346,3.3763875838,6.2495570303,3.6368780175,1.9114265226,1.3638434737,1.0712030642,5.9384930267,5.6963873226,1.0684250289,6.0505349685,6.6521205944,5.5307701619,-1.537390605,-3.554560965,-0.180037204,0.9115053597,11.283943611,8.4333544531,3.6268839829,10.201949703,10.028508178,11.780327192,2.0994874124,-1.643134443,1.1838062701,1.9827084239 +050,4,9,41,053,Oregon,Polk County,75403,75403,75540,75942,76227,76568,77702,79012,81496,83707,84854,85851,87744,137,402,285,341,1134,1310,2484,2211,1147,997,1893,218,870,907,855,875,812,953,894,836,869,846,189,604,635,656,649,705,692,686,753,691,783,29,266,272,199,226,107,261,208,83,178,63,16,71,33,45,109,80,140,112,41,20,22,96,69,-7,105,796,1115,2077,1884,1022,802,1818,112,140,26,150,905,1195,2217,1996,1063,822,1840,-4,-4,-13,-8,3,8,6,7,1,-3,-10,1885,1885,1979,1948,1907,1817,1794,1837,1834,1826,1799,1799,11.486513249,11.920956305,11.191465689,11.343747974,10.36282655,11.874797518,10.823048008,9.9192577168,10.181306933,9.7468245053,7.9745448304,8.3459837418,8.5866684119,8.4138199261,8.9972816723,8.6226231714,8.3049339298,8.9344510296,8.0958378489,9.0209971485,3.5119684187,3.5749725634,2.6047972774,2.9299280482,1.3655448779,3.2521743465,2.5181140778,0.9848066872,2.0854690841,0.7258273568,0.9374051042,0.4337282889,0.58902451,1.4131068905,1.020968133,1.7444613353,1.3559075804,0.4864707732,0.234322369,0.2534635214,0.9109993267,-0.09200297,1.3743905233,10.319569586,14.229743354,25.880329952,22.808302513,12.126173907,9.3963269969,20.945303724,1.8484044309,0.3417253186,1.9634150332,11.732676476,15.250711487,27.624791288,24.164210093,12.612644681,9.6306493659,21.198767246 +050,4,9,41,055,Oregon,Sherman County,1765,1766,1779,1750,1748,1728,1715,1691,1712,1740,1702,1790,1801,13,-29,-2,-20,-13,-24,21,28,-38,88,11,3,20,19,12,14,21,16,21,12,22,23,1,13,18,11,20,24,15,26,18,12,15,2,7,1,1,-6,-3,1,-5,-6,10,8,0,2,0,1,1,0,1,1,0,0,0,10,-37,-3,-21,-9,-21,19,33,-32,79,1,10,-35,-3,-20,-8,-21,20,34,-32,79,1,1,-1,0,-1,1,0,0,-1,0,-1,2,0,0,0,0,0,0,0,0,0,0,0,0,11.33465571,10.863350486,6.9044879171,8.1324426372,12.33118027,9.4034675287,12.166859791,6.9726902963,12.600229095,12.809802283,7.3675262114,10.291595197,6.3291139241,11.617775196,14.092777452,8.8157508081,15.06373117,10.459035445,6.8728522337,8.3542188805,3.9671294984,0.5717552887,0.5753739931,-3.485332559,-1.761597181,0.5877167205,-2.896871379,-3.486345148,5.7273768614,4.455583403,1.133465571,0,0.5753739931,0.5808887598,0,0.5877167205,0.5793742758,0,0,0,-20.96911306,-1.715265866,-12.08285386,-5.227998838,-12.33118027,11.16661769,19.119351101,-18.59384079,45.246277205,0.5569479254,-19.83564749,-1.715265866,-11.50747986,-4.647110078,-12.33118027,11.754334411,19.698725377,-18.59384079,45.246277205,0.5569479254 +050,4,9,41,057,Oregon,Tillamook County,25250,25244,25243,25393,25276,25332,25314,25554,26116,26511,26710,27132,27442,-1,150,-117,56,-18,240,562,395,199,422,310,55,254,251,262,234,241,262,245,234,235,248,79,285,279,286,266,293,301,341,310,283,318,-24,-31,-28,-24,-32,-52,-39,-96,-76,-48,-70,5,37,8,10,1,-4,-10,-9,-16,-16,-7,20,143,-92,68,16,295,608,496,292,489,390,25,180,-84,78,17,291,598,487,276,473,383,-2,1,-5,2,-3,1,3,4,-1,-3,-3,476,476,472,468,466,476,476,485,487,484,478,477,10.032388024,9.9074384732,10.354094214,9.240611302,9.4755052292,10.141281208,9.3108100405,8.7935213544,8.7292448275,9.088576978,11.256813334,11.012650733,11.30256086,10.504284642,11.520012582,11.650861235,12.959127444,11.649536837,10.512239516,11.653901125,-1.22442531,-1.10521226,-0.948466646,-1.26367334,-2.044507352,-1.509580027,-3.648317404,-2.856015483,-1.782994688,-2.565324147,1.4614108539,0.3157749314,0.3951944357,0.0394897919,-0.157269796,-0.387071802,-0.342029757,-0.601266417,-0.594331563,-0.256532415,5.6481554625,-3.631411711,2.6873221625,0.6318366702,11.59864748,23.533965551,18.849639919,10.973112117,18.164258386,14.292520248,7.1095663165,-3.31563678,3.0825165982,0.6713264621,11.441377683,23.146893749,18.507610162,10.3718457,17.569926823,14.035987833 +050,4,9,41,059,Oregon,Umatilla County,75889,75887,76093,76810,77011,76892,76711,76491,76700,77069,77332,77744,77752,206,717,201,-119,-181,-220,209,369,263,412,8,301,1088,1086,1110,1086,1014,1004,952,953,953,956,128,669,592,613,632,666,666,703,662,660,711,173,419,494,497,454,348,338,249,291,293,245,-8,5,-60,-58,22,-27,54,107,9,-3,3,47,296,-215,-561,-665,-541,-181,17,-35,122,-243,39,301,-275,-619,-643,-568,-127,124,-26,119,-240,-6,-3,-18,3,8,0,-2,-4,-2,0,3,3985,3986,3992,4022,4108,4134,4200,4185,4198,4157,4086,4089,14.231244645,14.12030867,14.424670084,14.140348821,13.237425099,13.10781965,12.382209678,12.344479634,12.290747762,12.296136235,8.7506458343,7.6972585018,7.9660565421,8.2290059439,8.6944034673,8.6950277758,9.1435855081,8.5750739956,8.5119554283,9.1449297731,5.480598811,6.4230501687,6.4586135423,5.9113428774,4.5430216316,4.4127918742,3.23862417,3.7694056386,3.7787923341,3.1512064619,0.0654009405,-0.780127551,-0.7537215,0.2864527386,-0.352475816,0.7050022521,1.3916979365,0.1165795558,-0.038690706,0.0385862016,3.8717356756,-2.795457057,-7.290306232,-8.658685052,-7.062570985,-2.363063104,0.2211108871,-0.453364939,1.573422064,-3.125482328,3.937136616,-3.575584608,-8.044027732,-8.372232313,-7.415046801,-1.658060852,1.6128088236,-0.336785384,1.5347313575,-3.086896126 +050,4,9,41,061,Oregon,Union County,25748,25737,25725,25906,25801,25531,25645,25720,26082,26410,26733,26733,26551,-12,181,-105,-270,114,75,362,328,323,0,-182,73,294,317,312,287,296,309,310,279,265,260,89,251,255,261,231,276,288,275,269,292,344,-16,43,62,51,56,20,21,35,10,-27,-84,7,45,7,11,17,21,35,33,22,19,13,1,92,-172,-339,44,39,307,263,292,9,-112,8,137,-165,-328,61,60,342,296,314,28,-99,-4,1,-2,7,-3,-5,-1,-3,-1,-1,1,735,735,880,809,699,699,701,664,802,966,876,878,11.388506905,12.261395943,12.1561599,11.216195091,11.525357734,11.930041311,11.81132363,10.499971774,9.912841806,9.7590271001,9.7228409289,9.8632680295,10.169095301,9.0276692199,10.746617346,11.119261805,10.477787091,10.1236287,10.922829462,12.911943548,1.6656659759,2.398127913,1.9870645991,2.1885258715,0.7787403874,0.8107795066,1.3335365389,0.3763430743,-1.009987656,-3.152916448,1.743138812,0.2707563773,0.4285825606,0.6643739253,0.8176774068,1.3512991776,1.257334451,0.8279547636,0.710732054,0.487951355,3.56375046,-6.652870985,-13.20813528,1.7195560419,1.5185437555,11.852824215,10.020574564,10.989217771,0.3366625519,-4.203888597,5.3068892719,-6.382114607,-12.77955272,2.3839299672,2.3362211623,13.204123393,11.277909015,11.817172534,1.0473946059,-3.715937242 +050,4,9,41,063,Oregon,Wallowa County,7008,7008,7012,6979,6800,6769,6778,6810,6912,7018,7043,7169,7181,4,-33,-179,-31,9,32,102,106,25,126,12,15,59,48,60,71,52,63,64,57,63,64,29,83,89,91,88,79,80,96,91,77,79,-14,-24,-41,-31,-17,-27,-17,-32,-34,-14,-15,1,3,1,1,0,0,0,1,1,0,0,17,-11,-142,0,27,58,118,136,58,141,28,18,-8,-141,1,27,58,118,137,59,141,28,0,-1,3,-1,-1,1,1,1,0,-1,-1,105,105,105,108,108,108,108,105,105,104,105,105,8.4339932814,6.9671238842,8.8436878178,10.482025541,7.6538121872,9.1823349366,9.1888011486,8.10753147,8.8657472558,8.9198606272,11.864770209,12.918208869,13.412926524,12.991806304,11.627906977,11.660107856,13.783201723,12.943602873,10.835913313,11.010452962,-3.430776928,-5.951084984,-4.569238706,-2.509780763,-3.97409479,-2.477772919,-4.594400574,-4.836071403,-1.970166057,-2.090592334,0.428847116,0.1451484143,0.147394797,0,0,0,0.1435750179,0.1422373942,0,0,-1.572439425,-20.61107482,0,3.9861223887,8.5369443627,17.198659088,19.526202441,8.2497688642,19.842386715,3.9024390244,-1.143592309,-20.46592641,0.147394797,3.9861223887,8.5369443627,17.198659088,19.669777459,8.3920062584,19.842386715,3.9024390244 +050,4,9,41,065,Oregon,Wasco County,25213,25211,25282,25217,25375,25329,25276,25469,25791,26296,26346,26532,26403,71,-65,158,-46,-53,193,322,505,50,186,-129,81,271,299,297,314,304,331,328,299,284,282,44,308,303,304,325,329,335,333,334,292,298,37,-37,-4,-7,-11,-25,-4,-5,-35,-8,-16,7,30,-11,12,2,5,12,11,-7,-9,-4,29,-58,173,-46,-41,213,314,495,91,203,-108,36,-28,162,-34,-39,218,326,506,84,194,-112,-2,0,0,-5,-3,0,0,4,1,0,-1,741,741,741,741,741,741,741,741,741,741,741,741,10.7328858,11.820050601,11.715052067,12.409840925,11.981476007,12.914553258,12.59431336,11.359750769,10.741707326,10.654576367,12.198261352,11.978178368,11.991164405,12.844580575,12.966794758,13.070620367,12.786299844,12.689487481,11.044290631,11.259091338,-1.465375552,-0.158127767,-0.276112338,-0.43473965,-0.985318751,-0.156067109,-0.191986484,-1.329736712,-0.302583305,-0.604514971,1.1881423395,-0.43485136,0.473335437,0.0790435728,0.1970637501,0.4682013266,0.4223702651,-0.265947342,-0.340406218,-0.151128743,-2.29707519,6.839025933,-1.814452509,-1.620393242,8.3949157552,12.251268045,19.006661931,3.4573154515,7.6780513635,-4.080476056,-1.10893285,6.4041745731,-1.341117072,-1.541349669,8.5919795054,12.719469372,19.429032196,3.1913681091,7.3376451454,-4.231604798 +050,4,9,41,067,Oregon,Washington County,529710,529865,531652,541041,548651,555443,562552,572955,585358,591969,597030,600933,603514,1787,9389,7610,6792,7109,10403,12403,6611,5061,3903,2581,1869,7104,7245,7187,7088,7046,7030,6876,6476,6478,6426,663,2860,3066,3076,3182,3321,3331,3493,3447,3502,3878,1206,4244,4179,4111,3906,3725,3699,3383,3029,2976,2548,463,2888,1425,1069,1987,1746,4079,2624,1257,868,718,167,2251,2040,1642,1300,4888,4603,618,775,37,-732,630,5139,3465,2711,3287,6634,8682,3242,2032,905,-14,-49,6,-34,-30,-84,44,22,-14,0,22,47,6788,6789,6758,6817,7144,7008,7079,7348,7462,7650,7402,7407,13.245168935,13.297335394,13.01881905,12.679842039,12.410315392,12.138342572,11.680697037,10.893196714,10.815025172,10.670457065,5.3323737547,5.6272781667,5.5719893415,5.69233315,5.8493694887,5.7514678675,5.9337805045,5.7981545821,5.8465912553,6.4394697318,7.91279518,7.6700572272,7.4468297083,6.9875088887,6.5609459035,6.3868747049,5.7469165321,5.0950421321,4.9684339166,4.2309873328,5.3845788124,2.6154179346,1.9364293258,3.5545776144,3.0752782678,7.0430013304,4.4575551227,2.1143836118,1.449126559,1.1922483928,4.1969137489,3.7441772538,2.9743844274,2.325591796,8.6093700875,7.947765414,1.049835772,1.3036175808,0.0617715238,-1.215495576,9.5814925612,6.3595951884,4.9108137532,5.8801694104,11.684648355,14.990766744,5.5073908948,3.4180011926,1.5108980828,-0.023247183 +050,4,9,41,069,Oregon,Wheeler County,1441,1441,1449,1418,1411,1380,1351,1327,1325,1353,1356,1348,1387,8,-31,-7,-31,-29,-24,-2,28,3,-8,39,4,9,9,8,12,8,15,11,12,10,8,5,20,28,15,16,26,12,20,20,16,17,-1,-11,-19,-7,-4,-18,3,-9,-8,-6,-9,0,0,0,0,0,0,-1,0,0,0,0,8,-19,12,-26,-25,-6,-4,35,12,-1,47,8,-19,12,-26,-25,-6,-5,35,12,-1,47,1,-1,0,2,0,0,0,2,-1,-1,1,25,25,25,26,27,24,24,24,24,24,24,24,6.2783397279,6.3626723224,5.7327122895,8.7879897473,5.9746079164,11.312217195,8.215085885,8.8593576966,7.3964497041,5.8500914077,13.951866062,19.794980559,10.748835543,11.717319663,19.417475728,9.0497737557,14.936519791,14.765596161,11.834319527,12.431444241,-7.673526334,-13.43230824,-5.016123253,-2.929329916,-13.44286781,2.2624434389,-6.721433906,-5.906238464,-4.437869822,-6.581352834,0,0,0,0,0,-0.754147813,0,0,0,0,-13.25427276,8.4835630965,-18.63131494,-18.30831197,-4.480955937,-3.016591252,26.138909634,8.8593576966,-0.73964497,34.36928702,-13.25427276,8.4835630965,-18.63131494,-18.30831197,-4.480955937,-3.770739065,26.138909634,8.8593576966,-0.73964497,34.36928702 +050,4,9,41,071,Oregon,Yamhill County,99193,99214,99298,99708,99933,99926,100850,101447,104143,105313,106390,106927,107664,84,410,225,-7,924,597,2696,1170,1077,537,737,261,1176,1120,1074,1129,1086,1177,1128,1076,1094,1078,217,859,828,815,838,954,891,1022,1020,900,956,44,317,292,259,291,132,286,106,56,194,122,16,108,8,35,90,18,31,18,-49,-67,-50,37,-13,-71,-294,553,453,2368,1043,1071,411,661,53,95,-63,-259,643,471,2399,1061,1022,344,611,-13,-2,-4,-7,-10,-6,11,3,-1,-1,4,5461,5461,5457,5398,5397,5453,5308,5610,5443,5449,5251,5250,11.818739133,11.220140152,10.747577042,11.246364107,10.736689125,11.449973248,10.770758536,10.165184244,10.257035304,10.047019679,8.6329055405,8.2948893263,8.1557498036,8.3476112683,9.4316771875,8.6677367576,9.7586127874,9.6361411978,8.4381460456,8.9099729252,3.185833593,2.9252508252,2.5918272382,2.898752839,1.3050119379,2.7822364901,1.012145749,0.5290430462,1.8188892587,1.1370467541,1.0853944102,0.0801438582,0.3502469241,0.8965214966,0.1779561733,0.3015710881,0.1718738064,-0.462912665,-0.628173095,-0.466002768,-0.130649327,-0.711276742,-2.942074162,5.5086265291,4.478563696,23.03613989,9.9591322282,10.117948258,3.8534200275,6.1605565937,0.9547450831,-0.631132884,-2.591827238,6.4051480257,4.6565198693,23.337710978,10.131006035,9.6550355923,3.225246933,5.6945538256 +040,1,2,42,000,Pennsylvania,Pennsylvania,12702379,12702891,12711406,12747052,12769123,12779538,12792392,12789838,12788468,12794679,12809107,12798883,12783254,8515,35646,22071,10415,12854,-2554,-1370,6211,14428,-10224,-15629,36111,142930,142104,141798,142223,141905,140389,137728,137444,134840,133740,30211,127734,125533,130942,126730,132748,129972,135728,135227,134010,143283,5900,15196,16571,10856,15493,9157,10417,2000,2217,830,-9543,5695,28385,26413,30378,35522,32725,38966,32239,32997,14722,14523,-1692,-7549,-19202,-29896,-36701,-43643,-50371,-27494,-20340,-25745,-20854,4003,20836,7211,482,-1179,-10918,-11405,4745,12657,-11023,-6331,-1388,-386,-1711,-923,-1460,-793,-382,-534,-446,-31,245,426618,426634,428437,430245,430783,429553,427368,425183,421950,421705,415344,415344,11.228488387,11.138346559,11.10022948,11.123368475,11.094028941,10.977192938,10.767088193,10.736224713,10.531088149,10.455733233,10.034700452,9.8394841703,10.250400207,9.9116492185,10.37814139,10.162674573,10.610735263,10.563047199,10.466264631,11.201800694,1.1937879348,1.2988623883,0.8498292729,1.2117192562,0.7158875516,0.8145183657,0.1563529303,0.1731775137,0.064823518,-0.746067461,2.2299072473,2.0702946268,2.3780502626,2.7782025056,2.5584165258,3.0468006755,2.5203310601,2.5775094355,1.1497973875,1.1354016281,-0.593044559,-1.50508452,-2.340318344,-2.870412988,-3.411977767,-3.938572007,-2.149383733,-1.588827527,-2.010700567,-1.630356369,1.6368626882,0.5652101069,0.0377319187,-0.092210482,-0.853561242,-0.891771332,0.3709473272,0.9886819082,-0.860903179,-0.494954741 +050,1,2,42,001,Pennsylvania,Adams County,101407,101419,101472,101476,101265,101156,101376,101847,101952,102629,103035,102776,102742,53,4,-211,-109,220,471,105,677,406,-259,-34,267,1048,962,1096,1067,1031,975,1007,989,910,899,201,922,917,1026,968,1033,1050,1004,1129,1076,1106,66,126,45,70,99,-2,-75,3,-140,-166,-207,9,24,36,27,67,101,186,42,82,6,14,-13,-144,-282,-197,71,386,-2,638,470,-100,157,-4,-120,-246,-170,138,487,184,680,552,-94,171,-9,-2,-10,-9,-17,-14,-4,-6,-6,1,2,3993,3993,4019,4041,4018,3964,4065,3964,4036,4036,4036,4038,10.32776869,9.4899403673,10.828915972,10.536606561,10.146489325,9.5682510709,9.8445114649,9.6176287537,8.8430647536,8.7486254245,9.0860713089,9.0460242378,10.137288127,9.5589832718,10.166172136,10.304270384,9.8151832282,10.979072662,10.456195247,10.763047519,1.2416973806,0.4439161294,0.6916278449,0.9776232892,-0.019682811,-0.736019313,0.0293282367,-1.361443909,-1.613130494,-2.014422094,0.2365137868,0.3551329036,0.2667707402,0.6616238422,0.9939819804,1.8253278966,0.4105953143,0.7974171464,0.0583059215,0.1362411078,-1.419082721,-2.781874411,-1.946438364,0.701123773,3.7987826181,-0.019627182,6.2371383462,4.5705616929,-0.971765358,1.5278467093,-1.182568934,-2.426741508,-1.679667623,1.3627476152,4.7927645985,1.8057007149,6.6477336605,5.3679788393,-0.913459436,1.6640878171 +050,1,2,42,003,Pennsylvania,Allegheny County,1223348,1223288,1223973,1228437,1231129,1233999,1233417,1229342,1226893,1220423,1217508,1215716,1211358,685,4464,2692,2870,-582,-4075,-2449,-6470,-2915,-1792,-4358,3357,13164,13104,13163,13063,13175,13316,13046,12825,12944,12681,3155,13854,13544,13856,13248,14168,13381,14285,14027,13644,14553,202,-690,-440,-693,-185,-993,-65,-1239,-1202,-700,-1872,576,2921,2666,3355,3839,3338,3765,2876,2448,1632,1303,44,2260,670,366,-4029,-6346,-6108,-8091,-4112,-2732,-3839,620,5181,3336,3721,-190,-3008,-2343,-5215,-1664,-1100,-2536,-137,-27,-204,-158,-207,-74,-41,-16,-49,8,50,35054,35057,35624,35913,36725,36638,36384,36776,35044,34937,34557,34557,10.735562161,10.655538416,10.679364317,10.588405036,10.699382278,10.842610744,10.661475674,10.521216556,10.639382153,10.449619583,11.298273943,11.013325115,11.241606927,10.738359482,11.505794923,10.895537276,11.674013491,11.507298607,11.214750471,11.99221779,-0.562711781,-0.357786699,-0.56224261,-0.149954446,-0.806412645,-0.052926532,-1.012537817,-0.986082051,-0.575368318,-1.542598207,2.3821465416,2.167862135,2.7219681899,3.1117574013,2.7107808762,3.0656675766,2.3503299124,2.008260283,1.3414301355,1.0737208672,1.8430849654,0.5448115643,0.2969419844,-3.26576467,-5.153569635,-4.973465487,-6.612141628,-3.37335224,-2.245580349,-3.163479976,4.225231507,2.7126736993,3.0189101742,-0.154007269,-2.442788758,-1.90779791,-4.261811715,-1.365091957,-0.904150214,-2.089759109 +050,1,2,42,005,Pennsylvania,Armstrong County,68941,69108,69029,68661,68223,68015,67631,66913,66464,66042,65411,64699,64162,-79,-368,-438,-208,-384,-718,-449,-422,-631,-712,-537,182,688,689,721,637,615,611,629,592,559,562,220,811,861,844,818,854,796,881,862,865,947,-38,-123,-172,-123,-181,-239,-185,-252,-270,-306,-385,3,4,4,3,5,5,1,1,1,0,1,-38,-246,-264,-78,-201,-482,-265,-166,-363,-405,-154,-35,-242,-260,-75,-196,-477,-264,-165,-362,-405,-153,-6,-3,-6,-10,-7,-2,0,-5,1,-1,1,650,650,650,650,650,650,650,650,650,650,650,650,9.9934635776,10.066917974,10.584418444,9.3920941274,9.1419907242,9.1619994452,9.4939097097,9.007021521,8.5927292291,8.7225770404,11.7800857,12.57999474,12.390082062,12.060805332,12.694731835,11.93609093,13.297511056,13.114953634,13.296441473,14.698007931,-1.786622122,-2.513076766,-1.805663618,-2.668711204,-3.552741111,-2.774091485,-3.803601346,-4.107932113,-4.703712243,-5.975430891,0.0581015324,0.0584436457,0.0440405761,0.073721304,0.0743251278,0.0149950891,0.0150936561,0.0152145634,0,0.0155205997,-3.573244244,-3.857280617,-1.145054977,-2.96359642,-7.164942324,-3.973698614,-2.505546919,-5.522886507,-6.225501499,-2.390172356,-3.515142712,-3.798836971,-1.101014401,-2.889875116,-7.090617196,-3.958703525,-2.490453262,-5.507671944,-6.225501499,-2.374651757 +050,1,2,42,007,Pennsylvania,Beaver County,170539,170532,170630,170330,170091,169770,169033,168311,166926,165779,164669,163956,162575,98,-300,-239,-321,-737,-722,-1385,-1147,-1110,-713,-1381,440,1697,1662,1737,1675,1662,1752,1591,1571,1568,1539,418,1990,2091,2226,2085,2184,2144,2165,2243,2138,2215,22,-293,-429,-489,-410,-522,-392,-574,-672,-570,-676,1,35,33,35,32,28,68,36,44,10,16,95,-34,198,161,-325,-207,-1058,-604,-476,-153,-723,96,1,231,196,-293,-179,-990,-568,-432,-143,-707,-20,-8,-41,-28,-34,-21,-3,-5,-6,0,2,3382,3382,3280,3299,3288,3256,3241,3211,3172,3195,3193,3195,9.9542468325,9.7643799883,10.221825982,9.8877518794,9.8534433694,10.452306875,9.5640281931,9.5083038784,9.5427919361,9.4263638062,11.67292351,12.284788541,13.09947302,12.308037414,12.948207171,12.79095088,13.014532394,13.575509611,13.011791556,13.566858889,-1.718676678,-2.520408553,-2.877647038,-2.420285535,-3.094763802,-2.338644004,-3.4505042,-4.067205733,-3.46899962,-4.140495083,0.2053026748,0.193877581,0.2059665569,0.1889003344,0.166002656,0.4056831436,0.2164079289,0.2663051373,0.0608596424,0.0979998836,-0.199436884,1.163265486,0.9474461618,-1.918519021,-1.227233921,-6.31195244,-3.630844141,-2.880937394,-0.931152529,-4.428369741,0.0058657907,1.357143067,1.1534127187,-1.729618687,-1.061231265,-5.906269296,-3.414436212,-2.614632257,-0.870292887,-4.330369858 +050,1,2,42,009,Pennsylvania,Bedford County,49762,49775,49697,49626,49592,49317,49131,48748,48592,48359,48090,47913,47817,-78,-71,-34,-275,-186,-383,-156,-233,-269,-177,-96,113,486,465,508,478,459,466,475,486,463,458,155,553,486,567,580,556,602,618,594,540,598,-42,-67,-21,-59,-102,-97,-136,-143,-108,-77,-140,0,0,4,7,10,7,15,8,7,3,3,-30,-2,-8,-222,-86,-291,-31,-95,-167,-102,41,-30,-2,-4,-215,-76,-284,-16,-87,-160,-99,44,-6,-2,-9,-1,-8,-2,-4,-3,-1,-1,0,551,551,551,551,551,551,551,551,551,551,551,551,9.7862529324,9.3732991997,10.272068265,9.7107102227,9.3789270426,9.5746866653,9.7987643242,10.077864986,9.6455319105,9.5685782931,11.135386567,9.7966094862,11.465084067,11.782870145,11.360966091,12.369015821,12.74870811,12.317390538,11.249648448,12.493471221,-1.349133635,-0.423310286,-1.193015802,-2.072159922,-1.982039048,-2.794329156,-2.949943786,-2.239525552,-1.604116538,-2.924892928,0,0.0806305308,0.1415442477,0.2031529335,0.1430337457,0.3081980686,0.1650318202,0.1451544339,0.0624980469,0.062676277,-0.040272646,-0.161261062,-4.488974714,-1.747115228,-5.946117145,-0.636942675,-1.959752865,-3.462970067,-2.124933596,0.8565757861,-0.040272646,-0.080630531,-4.347430466,-1.543962295,-5.803083399,-0.328744607,-1.794721045,-3.317815633,-2.062435549,0.9192520631 +050,1,2,42,011,Pennsylvania,Berks County,411442,411569,412041,413027,413552,413975,414632,415218,415911,417601,420407,420375,421017,472,986,525,423,657,586,693,1690,2806,-32,642,1245,4927,4894,4865,4860,4834,4787,4684,4730,4582,4564,861,3675,3675,3842,3711,3943,4003,4054,4025,3887,4204,384,1252,1219,1023,1149,891,784,630,705,695,360,227,1248,998,1220,1636,1627,2025,1748,2219,472,776,-93,-1505,-1676,-1815,-2117,-1919,-2109,-675,-102,-1208,-508,134,-257,-678,-595,-481,-292,-84,1073,2117,-736,268,-46,-9,-16,-5,-11,-13,-7,-13,-16,9,14,12163,12164,12283,12060,11811,11841,11689,11551,11404,11771,11405,11407,11.94325801,11.841578361,11.757924515,11.730530879,11.650298247,11.519270775,11.239190318,11.288675048,10.899377009,10.848688839,8.9083566445,8.8920720222,9.2854976333,8.957201665,9.5029222149,9.6326803661,9.7275144209,9.6061135455,9.2461541755,9.9929640405,3.0349013657,2.9495063388,2.4724268815,2.773329214,2.1473760318,1.8865904089,1.5116758967,1.682561503,1.653222833,0.8557247989,3.0252051952,2.4147722117,2.9485442771,3.9487959913,3.9211905766,4.872889768,4.1943007419,5.2958921633,1.1227642837,1.8445623443,-3.64818415,-4.055268764,-4.386563822,-5.109780632,-4.624932217,-5.075024455,-1.619652746,-0.24343443,-2.87351537,-1.207522772,-0.622978954,-1.640496553,-1.438019545,-1.16098464,-0.70374164,-0.202134687,2.5746479955,5.0524577331,-1.750751086,0.6370395725 +050,1,2,42,013,Pennsylvania,Blair County,127089,127121,127049,126990,126569,125869,125309,124637,123779,123173,122567,121942,121007,-72,-59,-421,-700,-560,-672,-858,-606,-606,-625,-935,337,1341,1319,1320,1303,1330,1338,1203,1219,1176,1164,394,1599,1500,1697,1556,1633,1641,1660,1543,1620,1740,-57,-258,-181,-377,-253,-303,-303,-457,-324,-444,-576,11,31,26,25,28,39,35,29,28,16,19,-9,175,-245,-335,-314,-401,-584,-171,-307,-197,-381,2,206,-219,-310,-286,-362,-549,-142,-279,-181,-362,-17,-7,-21,-13,-21,-7,-6,-7,-3,0,3,3672,3672,3701,3721,3730,3755,3753,3756,3710,3711,3721,3721,10.557434095,10.403890219,10.458013453,10.37511247,10.642298737,10.772252995,9.7427840228,9.9210547733,9.619277818,9.5822580048,12.588618283,11.831565829,13.444885477,12.38962011,13.066822434,13.211709391,13.443908128,12.557988118,13.251045974,14.323993925,-2.031184188,-1.42767561,-2.986872024,-2.01450764,-2.424523697,-2.439456396,-3.701124105,-2.636933344,-3.631768156,-4.74173592,0.2440570149,0.2050804744,0.1980684366,0.2229494621,0.3120674066,0.2817853922,0.2348634552,0.2278831285,0.1308745281,0.1564114279,1.377741213,-1.932489085,-2.654117051,-2.500218968,-3.208693078,-4.701790545,-1.384884512,-2.49857573,-1.611392628,-3.136460739,1.6217982278,-1.727408611,-2.456048614,-2.277269506,-2.896625671,-4.420005153,-1.150021057,-2.270692602,-1.4805181,-2.980049311 +050,1,2,42,015,Pennsylvania,Bradford County,62622,62700,62731,63111,63005,62519,61957,61656,61103,60996,60858,60429,60221,31,380,-106,-486,-562,-301,-553,-107,-138,-429,-208,195,751,727,762,756,711,688,690,648,664,652,158,716,624,697,634,734,714,681,698,724,787,37,35,103,65,122,-23,-26,9,-50,-60,-135,3,12,22,24,28,30,46,29,24,18,18,-1,334,-229,-584,-725,-304,-573,-142,-108,-386,-92,2,346,-207,-560,-697,-274,-527,-113,-84,-368,-74,-8,-1,-2,9,13,-4,0,-3,-4,-1,1,666,666,666,666,666,666,666,666,666,666,666,664,11.935601786,11.529068477,12.14110449,12.146919888,11.503644439,11.20895413,11.302303868,10.635678763,10.949236109,10.808122669,11.379348707,9.8956516223,11.10544597,10.186702658,11.875773584,11.632548326,11.154882513,11.456332989,11.938624914,13.046000829,0.5562530793,1.6334168543,1.0356585195,1.9602172306,-0.372129145,-0.423594197,0.1474213548,-0.820654226,-0.989388805,-2.23787816,0.1907153415,0.3488851534,0.3823969918,0.4498859218,0.4853858413,0.7494358866,0.4750243655,0.3939140283,0.2968166415,0.2983837547,5.3082436706,-3.631577278,-9.304993467,-11.6488319,-4.918576525,-9.335364413,-2.325981376,-1.772613127,-6.365067979,-1.525072524,5.4989590121,-3.282692125,-8.922596476,-11.19894598,-4.433190684,-8.585928527,-1.85095701,-1.378699099,-6.068251338,-1.226688769 +050,1,2,42,017,Pennsylvania,Bucks County,625249,625426,625572,626164,625603,625325,625618,625670,626369,627302,628183,628497,627987,146,592,-561,-278,293,52,699,933,881,314,-510,1498,5845,5781,5735,5787,5739,5924,5782,5833,5667,5615,1212,5446,5367,5719,5686,5923,5845,6191,6273,6207,6632,286,399,414,16,101,-184,79,-409,-440,-540,-1017,215,775,633,765,978,890,1168,767,684,309,244,-323,-570,-1579,-1027,-710,-609,-522,617,670,553,260,-108,205,-946,-262,268,281,646,1384,1354,862,504,-32,-12,-29,-32,-76,-45,-26,-42,-33,-8,3,8401,8402,8337,8315,8244,8288,8336,8257,8196,8206,8248,8250,9.3390299552,9.2365432225,9.1691927913,9.2522201251,9.1729481942,9.4629640131,9.2241106319,9.2920265873,9.0190024509,8.9376386806,8.7015153355,8.5750782694,9.1436117826,9.0907419443,9.4670451567,9.336769861,9.8765944175,9.9929509313,9.8784097781,10.556441626,0.6375146197,0.6614649531,0.0255810087,0.1614781809,-0.294096962,0.1261941521,-0.652483786,-0.700924344,-0.859407327,-1.618802945,1.2382802764,1.0113703269,1.2230919765,1.5636204048,1.4225342207,1.8657565779,1.2236065124,1.0896187529,0.4917719706,0.3883853674,-0.910735171,-2.522833722,-1.641980993,-1.135143648,-0.973397012,-0.83383984,0.9843092805,1.0673166147,0.8800967629,0.4138532604,0.3275451054,-1.511463395,-0.418889017,0.4284767571,0.449137209,1.0319167374,2.2079157929,2.1569353676,1.3718687335,0.8022386278 +050,1,2,42,019,Pennsylvania,Butler County,183862,183851,184085,184766,185016,185185,185874,186046,186427,187083,188031,188313,189135,234,681,250,169,689,172,381,656,948,282,822,500,1779,1831,1796,1824,1813,1835,1758,1750,1813,1783,377,1873,1836,1935,1924,1952,1869,2114,1988,2018,2133,123,-94,-5,-139,-100,-139,-34,-356,-238,-205,-350,25,77,69,105,115,93,188,131,135,55,59,105,703,229,227,703,238,238,893,1058,432,1111,130,780,298,332,818,331,426,1024,1193,487,1170,-19,-5,-43,-24,-29,-20,-11,-12,-7,0,2,5490,5490,5573,5579,5474,5619,5579,5542,5527,5542,5441,5443,9.6461714893,9.9031321157,9.7028371074,9.8313206256,9.7494084749,9.853063175,9.4134025863,9.3304968623,9.6348022022,9.4476590153,10.155862394,9.9301750761,10.453780514,10.370318467,10.49688105,10.035626743,11.319643383,10.599444436,10.724231023,11.302219114,-0.509690905,-0.02704296,-0.750943406,-0.538997841,-0.747472575,-0.182563568,-1.906240797,-1.268947573,-1.08942882,-1.854560098,0.4175127626,0.3731928542,0.5672594077,0.6198475175,0.50010755,1.0094691427,0.7014537763,0.7197811865,0.2922857811,0.3126258451,3.8118373002,1.2385675885,1.2263608148,3.7891548244,1.279845128,1.2779449786,4.7816658189,5.6409518173,2.2957719533,5.8869036265,4.2293500628,1.6117604426,1.7936202225,4.4090023419,1.779952678,2.2874141213,5.4831195952,6.3607330038,2.5880577344,6.1995294716 +050,1,2,42,021,Pennsylvania,Cambria County,143679,143693,143458,142590,141563,138858,137587,136083,134517,133035,131478,130107,128672,-235,-868,-1027,-2705,-1271,-1504,-1566,-1482,-1557,-1371,-1435,366,1360,1382,1367,1355,1343,1363,1322,1264,1157,1171,492,1880,1765,1862,1758,1931,1854,1945,1864,1775,1837,-126,-520,-383,-495,-403,-588,-491,-623,-600,-618,-666,12,51,51,69,57,42,66,43,44,19,19,-106,-394,-687,-2350,-928,-960,-1140,-902,-1003,-770,-787,-94,-343,-636,-2281,-871,-918,-1074,-859,-959,-751,-768,-15,-5,-8,71,3,2,-1,0,2,-2,-1,8092,8094,8116,8063,6488,6450,6278,6057,5977,5910,5933,5924,9.5088936123,9.7271540332,9.7496264545,9.8030349617,9.8147403808,10.07390983,9.8821911255,9.5571862253,8.8460729782,9.0501934083,13.144647052,12.422884854,13.280032523,12.718623958,14.111886579,13.702882483,14.539229757,14.093825256,13.571114552,14.197442605,-3.63575344,-2.695730821,-3.530406068,-2.915588996,-4.297146198,-3.628972653,-4.657038632,-4.536639031,-4.725041573,-5.147249197,0.3565835105,0.3589615454,0.4921172095,0.4123785925,0.3069390141,0.487804878,0.321432843,0.3326868623,0.1452682684,0.1468434456,-2.754782414,-4.83542317,-16.76051366,-6.713812874,-7.015748895,-8.425720621,-6.74261452,-7.583748247,-5.887187721,-6.082410087,-2.398198904,-4.476461625,-16.26839645,-6.301434282,-6.708809881,-7.937915743,-6.421181677,-7.251061385,-5.741919453,-5.935566642 +050,1,2,42,023,Pennsylvania,Cameron County,5085,5085,5080,5012,4974,4927,4829,4773,4702,4611,4494,4425,4330,-5,-68,-38,-47,-98,-56,-71,-91,-117,-69,-95,19,45,45,48,45,49,41,41,38,36,33,18,72,67,69,46,55,57,67,73,72,76,1,-27,-22,-21,-1,-6,-16,-26,-35,-36,-43,0,1,2,3,8,8,5,6,6,4,2,-7,-41,-18,-28,-109,-57,-59,-72,-88,-37,-55,-7,-40,-16,-25,-101,-49,-54,-66,-82,-33,-53,1,-1,0,-1,4,-1,-1,1,0,0,1,92,92,92,92,92,92,92,92,92,92,92,92,8.9179548157,9.0126176647,9.695990304,9.2250922509,10.20620704,8.654353562,8.8048963814,8.3470620538,8.072653885,7.5385494003,14.268727705,13.418786301,13.937986062,9.4300943009,11.455946678,12.031662269,14.388489209,16.035145524,16.14530777,17.36150771,-5.350772889,-4.406168636,-4.241995758,-0.20500205,-1.249739638,-3.377308707,-5.583592827,-7.688083471,-8.072653885,-9.82295831,0.1981767737,0.4005607851,0.605999394,1.6400164002,1.6663195168,1.055408971,1.2885214217,1.3179571664,0.8969615428,0.4568817818,-8.125247721,-3.605047066,-5.655994344,-22.34522345,-11.87252656,-12.45382586,-15.46225706,-19.33003844,-8.296894271,-12.564249,-7.927070947,-3.204486281,-5.04999495,-20.70520705,-10.20620704,-11.39841689,-14.17373564,-18.01208127,-7.399932728,-12.10736722 +050,1,2,42,025,Pennsylvania,Carbon County,65249,65244,65247,65084,64799,64545,64264,63766,63561,63885,64169,64125,64081,3,-163,-285,-254,-281,-498,-205,324,284,-44,-44,155,600,568,628,559,575,621,571,570,548,542,147,860,777,814,756,850,809,808,865,774,857,8,-260,-209,-186,-197,-275,-188,-237,-295,-226,-315,-5,-6,-3,5,21,14,40,39,48,6,13,9,106,-62,-65,-93,-232,-53,523,532,176,258,4,100,-65,-60,-72,-218,-13,562,580,182,271,-9,-3,-11,-8,-12,-5,-4,-1,-1,0,0,699,699,699,699,699,699,699,699,700,701,700,700,9.2073259624,8.7463332384,9.710539337,8.6795177356,8.9822697805,9.7544118687,8.9606578472,8.9024942602,8.5428780769,8.455142505,13.197167213,11.964614307,12.586590797,11.738310211,13.278137936,12.707438328,12.679880106,13.5099255,12.066035824,13.36910909,-3.98984125,-3.218281068,-2.87605146,-3.058792476,-4.295868156,-2.953026459,-3.719222259,-4.60743124,-3.523157747,-4.913966585,-0.09207326,-0.046195422,0.0773132113,0.3260641725,0.2186987425,0.628303502,0.612023916,0.7496837272,0.0935351614,0.202798621,1.6266275867,-0.954705389,-1.005071747,-1.443998478,-3.62415059,-0.83250214,8.2073976429,8.3089946429,2.7436980685,4.0247726315,1.5345543271,-1.000900811,-0.927758535,-1.117934306,-3.405451847,-0.204198638,8.8194215589,9.0586783701,2.8372332299,4.2275712525 +050,1,2,42,027,Pennsylvania,Centre County,153990,154008,154242,155107,155905,158342,159798,160641,162287,162549,162895,162095,161496,234,865,798,2437,1456,843,1646,262,346,-800,-599,365,1193,1286,1243,1205,1273,1250,1220,1162,1153,1137,224,944,928,920,903,956,947,982,1043,1059,1208,141,249,358,323,302,317,303,238,119,94,-71,168,960,919,1111,1280,1156,1332,1035,879,648,508,-61,-345,-471,971,-97,-627,15,-1020,-659,-1550,-1043,107,615,448,2082,1183,529,1347,15,220,-902,-535,-14,1,-8,32,-29,-3,-4,9,7,8,7,16989,16987,17189,17292,19445,19643,19310,19724,19617,19591,19155,19160,7.7129714336,8.2697773719,7.9109744882,7.5752813227,7.945349973,7.7416637764,7.5114827174,7.1410135077,7.0956029416,7.0273895133,6.1031391729,5.9676153975,5.8552667169,5.6767460866,5.9668142767,5.865084477,6.0461278922,6.4097048955,6.5171236038,7.4662150678,1.6098322607,2.3021619745,2.0557077713,1.8985352361,1.9785356963,1.8765792994,1.4653548252,0.7313086122,0.5784793378,-0.438825554,6.2065822097,5.9097398171,7.0708710027,8.0467718614,7.2151017822,8.2495169202,6.3724464037,5.4018510097,3.9878150097,3.1397659391,-2.230490482,-3.028822039,6.1798521545,-0.60979443,-3.91338133,0.0928999653,-6.280092108,-4.049851895,-9.538755039,-6.446409202,3.9760917281,2.8809177781,13.250723157,7.4369774313,3.3017204523,8.3424168855,0.0923542957,1.3519991151,-5.550940029,-3.306643263 +050,1,2,42,029,Pennsylvania,Chester County,498886,499141,499935,503488,506049,509101,512776,515098,516768,519057,522256,525059,526759,794,3553,2561,3052,3675,2322,1670,2289,3199,2803,1700,1444,5596,5607,5469,5579,5729,5333,5309,5317,5430,5359,908,3636,3627,3722,3717,3898,3856,4060,4126,4160,4549,536,1960,1980,1747,1862,1831,1477,1249,1191,1270,810,256,1055,876,961,1473,1401,1877,1080,1059,514,446,57,558,-219,417,438,-882,-1674,-14,979,1022,431,313,1613,657,1378,1911,519,203,1066,2038,1536,877,-55,-20,-76,-73,-98,-28,-10,-26,-30,-3,13,13602,13607,13759,13561,13441,13523,13381,13399,13391,13397,13407,13409,11.153820473,11.108062409,10.77476235,10.91912236,11.147280698,10.336613475,10.250766297,10.212107215,10.369373111,10.189975832,7.2471928588,7.1854721521,7.332906467,7.2748481471,7.5845872159,7.4738386573,7.8391620206,7.9246105638,7.9441237832,8.6497854192,3.9066276137,3.9225902567,3.4418558834,3.644274213,3.5626934819,2.8627748177,2.4116042768,2.2874966509,2.425249328,1.5401904132,2.1028021084,1.7354490227,1.8933162587,2.8829301374,2.7260150563,3.6380692842,2.0852943306,2.0339705737,0.9815576021,0.8480554621,1.1121929635,-0.433862256,0.821553465,0.8572460286,-1.716163654,-3.244607342,-0.027031593,1.8803184057,1.9516573333,0.8195334174,3.2149950719,1.301586767,2.7148697237,3.740176166,1.009851402,0.3934619418,2.0582627374,3.9142889794,2.9332149353,1.6675888794 +050,1,2,42,031,Pennsylvania,Clarion County,39988,39988,39926,39904,39472,39087,38923,38889,38607,39020,38735,38498,38305,-62,-22,-432,-385,-164,-34,-282,413,-285,-237,-193,98,413,388,416,422,407,409,390,378,374,363,114,421,427,424,432,413,415,422,403,464,481,-16,-8,-39,-8,-10,-6,-6,-32,-25,-90,-118,4,25,27,34,21,22,22,16,15,12,9,-48,-38,-436,-419,-172,-46,-299,425,-275,-159,-85,-44,-13,-409,-385,-151,-24,-277,441,-260,-147,-76,-2,-1,16,8,-3,-4,1,4,0,0,1,1841,1841,1738,1500,1423,1462,1378,1377,1924,1774,1774,1774,10.346987348,9.7762547873,10.590766176,10.819125753,10.461111397,10.555383504,10.048050292,9.7228474053,9.6849792187,9.4527557517,10.547413253,10.758919573,10.794434756,11.075503141,10.615329255,10.710230205,10.8725057,10.365892869,12.015589191,12.525552387,-0.200425905,-0.982664785,-0.20366858,-0.256377388,-0.154217858,-0.154846702,-0.824455409,-0.643045463,-2.330609972,-3.072796636,0.6263309533,0.6803063898,0.8655914663,0.5383925138,0.5654654809,0.5677712398,0.4122277043,0.385827278,0.3107479963,0.2343658451,-0.952023049,-10.98568837,-10.66714189,-4.409691065,-1.182336915,-7.716527305,10.949798395,-7.073500096,-4.117410951,-2.213455204,-0.325692096,-10.30538198,-9.801550427,-3.871298551,-0.616871434,-7.148756065,11.362026099,-6.687672818,-3.806662955,-1.979089358 +050,1,2,42,033,Pennsylvania,Clearfield County,81642,81609,81543,81438,81407,81444,81018,80735,80190,79803,79542,79183,78612,-66,-105,-31,37,-426,-283,-545,-387,-261,-359,-571,213,750,694,790,717,783,731,732,735,709,681,279,912,896,937,911,921,894,1001,1002,953,1008,-66,-162,-202,-147,-194,-138,-163,-269,-267,-244,-327,8,41,60,57,68,69,76,68,55,41,35,3,19,128,134,-291,-209,-457,-182,-47,-158,-281,11,60,188,191,-223,-140,-381,-114,8,-117,-246,-11,-3,-17,-7,-9,-5,-1,-4,-2,2,2,5115,5121,5160,5401,5757,5714,5577,5429,5507,5658,5679,5668,9.2035267915,8.5234425374,9.7021203431,8.8266794697,9.6814278561,9.084977474,9.15040033,9.2252659324,8.9336903449,8.6314522006,11.191488578,11.00432927,11.507451597,11.214930261,11.387733149,11.110765885,12.513047446,12.576484985,12.008190266,12.776070218,-1.987961787,-2.480886733,-1.805331254,-2.388250791,-1.706305293,-2.025788411,-3.362647116,-3.351219053,-3.074499921,-4.144618017,0.5031261313,0.7368970493,0.7000264045,0.8371188339,0.8531526463,0.9445393817,0.8500371891,0.6903260222,0.51661679,0.4436135492,0.2331560121,1.5720470386,1.6456761088,-3.582376186,-2.584187001,-5.67966444,-2.275099536,-0.589914964,-1.990864703,-3.561583067,0.7362821433,2.3089440879,2.3457025133,-2.745257352,-1.731034355,-4.735125058,-1.425062346,0.1004110578,-1.474247913,-3.117969517 +050,1,2,42,035,Pennsylvania,Clinton County,39238,39248,39262,39511,39739,39835,39490,39402,39009,38830,38647,38302,37957,14,249,228,96,-345,-88,-393,-179,-183,-345,-345,133,395,443,439,433,446,405,377,424,413,411,116,361,410,388,422,392,397,410,430,421,424,17,34,33,51,11,54,8,-33,-6,-8,-13,3,21,9,24,13,12,14,10,11,5,3,-1,194,183,28,-375,-151,-418,-155,-184,-343,-335,2,215,192,52,-362,-139,-404,-145,-173,-338,-332,-5,0,3,-7,6,-3,3,-1,-4,1,0,2623,2623,2619,2785,2661,2430,2432,2174,2058,2057,1754,1753,10.02881698,11.179810726,11.033754744,10.917113142,11.30659636,10.330183265,9.6866609283,10.945183732,10.734382513,10.779055587,9.1655770378,10.347003155,9.751929022,10.639773085,9.9376362622,10.126130262,10.534564935,11.100068407,10.942312441,11.119998951,0.8632399426,0.832807571,1.281825722,0.2773400567,1.3689600973,0.2040530028,-0.847904007,-0.154884675,-0.207929928,-0.340943364,0.5331776116,0.2271293375,0.6032121045,0.3277655216,0.304213355,0.3570927548,0.2569406082,0.2839552383,0.1299562048,0.0786792379,4.9255455549,4.61829653,0.7037474552,-9.454774661,-3.82801805,-10.66176939,-3.982579427,-4.749796714,-8.914995646,-8.785848228,5.4587231666,4.8454258675,1.3069595597,-9.12700914,-3.523804695,-10.30467664,-3.725638819,-4.465841476,-8.785039442,-8.70716899 +050,1,2,42,037,Pennsylvania,Columbia County,67295,67296,67355,67085,67045,67203,67135,66704,66171,65638,65278,65020,64842,59,-270,-40,158,-68,-431,-533,-533,-360,-258,-178,187,619,612,596,636,601,569,536,552,516,521,145,682,678,642,685,726,700,711,744,714,774,42,-63,-66,-46,-49,-125,-131,-175,-192,-198,-253,13,51,28,31,32,12,31,20,16,12,11,15,-258,13,177,-35,-315,-435,-377,-183,-73,62,28,-207,41,208,-3,-303,-404,-357,-167,-61,73,-11,0,-15,-4,-16,-3,2,-1,-1,1,2,4387,4387,4251,4126,4359,4304,4278,3941,3680,3541,3509,3509,9.2085688783,9.1254752852,8.8790894464,9.4686536944,8.9809397859,8.5644402634,8.1329802972,8.4328882642,7.9203057606,8.0239022963,10.145789943,10.109595169,9.5643882963,10.198156888,10.848855715,10.53621825,10.78833767,11.366066791,10.959492855,11.920346214,-0.937221065,-0.984119884,-0.68529885,-0.729503193,-1.867915929,-1.971777987,-2.655357373,-2.933178527,-3.039187094,-3.896443917,0.758702767,0.4175054052,0.4618318336,0.4764102488,0.1793199292,0.4666039511,0.3034694141,0.2444315439,0.1841931572,0.1694106051,-3.83814341,0.1938417953,2.636910792,-0.52107371,-4.707148141,-6.547507056,-5.720398455,-2.795685783,-1.120508373,0.9548597742,-3.079440643,0.6113472005,3.0987426256,-0.044663461,-4.527828212,-6.080903104,-5.416929041,-2.551254239,-0.936315216,1.1242703793 +050,1,2,42,039,Pennsylvania,Crawford County,88765,88750,88614,88176,87745,87532,87180,86540,86353,85790,85111,84421,83697,-136,-438,-431,-213,-352,-640,-187,-563,-679,-690,-724,257,901,925,974,866,986,967,909,942,898,885,282,1018,898,1037,981,1092,982,1040,964,1018,1043,-25,-117,27,-63,-115,-106,-15,-131,-22,-120,-158,4,4,13,32,39,25,31,18,10,7,9,-112,-324,-468,-171,-269,-556,-199,-449,-668,-575,-575,-108,-320,-455,-139,-230,-531,-168,-431,-658,-568,-566,-3,-1,-3,-11,-7,-3,-4,-1,1,-2,0,3875,3875,3803,3874,3894,3861,3825,3984,3834,3817,3682,3685,10.192884213,10.516083924,11.113836955,9.9134575759,11.351600276,11.186109328,10.560987086,11.023926133,10.593870184,10.528319395,11.516488489,10.209127961,11.832699099,11.229909794,12.57195487,11.359627053,12.082977524,11.281385129,12.009532124,12.407951558,-1.323604276,0.3069559632,-0.718862144,-1.316452219,-1.220354594,-0.173517725,-1.521990438,-0.257458997,-1.41566194,-1.879632163,0.0452514282,0.1477936119,0.3651363271,0.4464490132,0.2878194796,0.358603298,0.2091284572,0.1170268167,0.0825802798,0.1070676549,-3.665365688,-5.320570029,-1.951197248,-3.07935345,-6.401105227,-2.302001816,-5.216593181,-7.817391355,-6.783380129,-6.840433505,-3.62011426,-5.172776417,-1.586060921,-2.632904437,-6.113285747,-1.943398518,-5.007464724,-7.700364539,-6.700799849,-6.73336585 +050,1,2,42,041,Pennsylvania,Cumberland County,235406,235403,235903,237151,239315,241153,243400,245891,247633,249328,251486,253133,255857,500,1248,2164,1838,2247,2491,1742,1695,2158,1647,2724,634,2546,2468,2465,2541,2536,2674,2595,2644,2600,2592,529,2171,2229,2347,2135,2303,2271,2460,2510,2365,2510,105,375,239,118,406,233,403,135,134,235,82,152,535,586,636,678,656,748,627,564,305,282,262,348,1355,1099,1199,1614,609,947,1468,1113,2367,414,883,1941,1735,1877,2270,1357,1574,2032,1418,2649,-19,-10,-16,-15,-36,-12,-18,-14,-8,-6,-7,12830,12831,12667,12767,12766,12557,12616,12382,12239,12387,11802,11803,10.764098813,10.359605932,10.260829025,10.488016791,10.366019404,10.836352437,10.443475444,10.558810257,10.304804219,10.184875931,9.1786561365,9.3563863948,9.7696412664,8.8122455129,9.4136209331,9.2031998444,9.900173253,10.023681447,9.3734084527,9.8626692076,1.5854426767,1.0032195372,0.4911877586,1.6757712779,0.9523984704,1.6331525924,0.5433021907,0.5351288103,0.9313957659,0.3222067231,2.2618982188,2.4597767732,2.6474187667,2.7984554837,2.6814308867,3.0312608911,2.5233368413,2.2523332015,1.2088328026,1.1080767795,1.471290804,5.6877090915,4.574706328,4.9488910398,6.5973009927,2.4679650838,3.8111642564,5.8624559218,4.4112488828,9.3007721173,3.7331890228,8.1474858647,7.2221250947,7.7473465235,9.2787318794,5.4992259748,6.3345010977,8.1147891233,5.6200816854,10.408848897 +050,1,2,42,043,Pennsylvania,Dauphin County,268100,268127,268289,269278,270058,271500,272312,273195,274305,275796,276951,278427,279874,162,989,780,1442,812,883,1110,1491,1155,1476,1447,857,3486,3398,3469,3403,3420,3434,3417,3426,3388,3381,573,2501,2406,2470,2417,2455,2509,2634,2508,2636,2798,284,985,992,999,986,965,925,783,918,752,583,185,851,868,1004,1193,1104,1264,1112,1157,503,538,-293,-841,-1056,-524,-1352,-1168,-1074,-393,-916,217,313,-108,10,-188,480,-159,-64,190,719,241,720,851,-14,-6,-24,-37,-15,-18,-5,-11,-4,4,13,6780,6776,6775,6777,6787,6788,6790,6789,6782,6785,7058,7057,12.969546122,12.600679354,12.811185506,12.515354571,12.538794186,12.544292237,12.423173199,12.396268094,12.200699344,12.111746173,9.3048866467,8.9220819675,9.1218299794,8.8891013806,9.0008010896,9.1652968037,9.5764232386,9.0746761176,9.4926338458,10.023267019,3.664659475,3.6785973864,3.6893555261,3.6262531904,3.5379930963,3.3789954338,2.8467499605,3.3215919761,2.7080654977,2.0884791537,3.1661169677,3.2187727131,3.707820769,4.3875456959,4.0476107548,4.6173515982,4.0428939413,4.1863637433,1.8113789167,1.9272757885,-3.128912303,-3.91592625,-1.935157453,-4.972306606,-4.282254856,-3.923287671,-1.428828524,-3.314355392,0.7814497513,1.1212589625,0.0372046647,-0.697153537,1.7726633158,-0.58476091,-0.234644102,0.6940639269,2.6140654171,0.872008351,2.592828668,3.048534751 +050,1,2,42,045,Pennsylvania,Delaware County,558979,558776,559009,559338,560865,561635,562868,563434,563860,564015,565506,566506,566753,233,329,1527,770,1233,566,426,155,1491,1000,247,1692,6902,6795,6622,6794,6821,6544,6447,6588,6481,6418,1353,5501,5311,5692,5348,5450,5366,5584,5530,5452,5884,339,1401,1484,930,1446,1371,1178,863,1058,1029,534,401,1670,1415,1589,1781,1735,2033,1663,1535,891,763,-484,-2741,-1314,-1705,-1944,-2513,-2782,-2369,-1094,-928,-1071,-83,-1071,101,-116,-163,-778,-749,-706,441,-37,-308,-23,-1,-58,-44,-50,-27,-3,-2,-8,8,21,22797,22804,22687,22757,22551,22508,22504,22593,22680,22625,22257,22261,12.343217266,12.131729695,11.798663697,12.083560471,12.112204364,11.610103487,11.432117921,11.665121764,11.450408653,11.326625246,9.8377337267,9.4822099209,10.141648107,9.5117576387,9.6776885773,9.5201429263,9.9018064945,9.7917612864,9.6324067236,10.384210494,2.5054835395,2.6495197745,1.6570155902,2.571802832,2.4345157871,2.0899605604,1.5303114264,1.8733604776,1.8180019293,0.9424147525,2.986550686,2.5263278174,2.8311804009,3.1676216071,3.0808788407,3.6068674188,2.9489083453,2.7179662884,1.5741882595,1.3465589067,-4.901877503,-2.346003358,-3.037861915,-3.457527459,-4.462391082,-4.93571331,-4.200820126,-1.937104312,-1.639558591,-1.89012397,-1.915326817,0.180324459,-0.206681514,-0.289905852,-1.381512241,-1.328845891,-1.251911781,0.780861976,-0.065370332,-0.543565063 +050,1,2,42,047,Pennsylvania,Elk County,31946,31946,31862,31798,31619,31462,31187,30898,30516,30274,30096,29894,29607,-84,-64,-179,-157,-275,-289,-382,-242,-178,-202,-287,90,312,311,312,338,284,299,293,262,263,261,121,399,393,367,392,399,397,389,399,363,386,-31,-87,-82,-55,-54,-115,-98,-96,-137,-100,-125,0,0,1,2,2,3,3,1,0,0,1,-54,25,-98,-101,-224,-177,-287,-147,-38,-102,-164,-54,25,-97,-99,-222,-174,-284,-146,-38,-102,-163,1,-2,0,-3,1,0,0,0,-3,0,1,355,355,355,355,355,355,355,355,355,355,355,355,9.8020735156,9.808095621,9.892043563,10.790275982,9.1487476846,9.7371934738,9.6397433788,8.6798078516,8.7681280213,8.772961799,12.535344015,12.394152987,11.635833294,12.514166228,12.853346219,12.928648191,12.798157592,13.218486003,12.102017003,12.974571856,-2.7332705,-2.586057366,-1.743789731,-1.723890246,-3.704598534,-3.191454717,-3.158414213,-4.538678151,-3.333888981,-4.201610057,0,0.031537285,0.0634105357,0.0638477869,0.0966417009,0.0976975934,0.0329001481,0,0,0.0336128805,0.7854225573,-3.090653926,-3.202232051,-7.15095213,-5.701860353,-9.3464031,-4.836321763,-1.258903429,-3.400566761,-5.512512395,0.7854225573,-3.059116641,-3.138821515,-7.087104343,-5.605218652,-9.248705507,-4.803421615,-1.258903429,-3.400566761,-5.478899514 +050,1,2,42,049,Pennsylvania,Erie County,280566,280586,280809,281244,281416,280905,279660,278452,276639,273855,271780,269529,268426,223,435,172,-511,-1245,-1208,-1813,-2784,-2075,-2251,-1103,832,3269,3239,3152,3184,3166,3218,2988,2870,2737,2681,545,2804,2823,2889,2819,2933,2857,3050,2881,2877,3012,287,465,416,263,365,233,361,-62,-11,-140,-331,78,510,856,566,544,500,898,736,689,413,357,-114,-531,-1081,-1334,-2179,-1942,-3080,-3475,-2762,-2526,-1137,-36,-21,-225,-768,-1635,-1442,-2182,-2739,-2073,-2113,-780,-28,-9,-19,-6,25,1,8,17,9,2,8,12875,12876,12996,13208,13015,12990,12937,12679,12236,12287,12112,12120,11.632354956,11.513169587,11.210678598,11.359967176,11.345393039,11.594495317,10.855704149,10.519853015,10.112523531,9.9673764534,9.9777067287,10.034479082,10.275269819,10.057709632,10.510435181,10.293807682,11.080956377,10.560173009,10.629788162,11.197962655,1.6546482271,1.4786905058,0.935408779,1.3022575437,0.8349578579,1.300687635,-0.225252228,-0.040319994,-0.517264631,-1.230586201,1.8147754749,3.0426900793,2.0130850528,1.9408989145,1.7917550599,3.2355055297,2.6739619324,2.5254978145,1.5259306607,1.3272485617,-1.889501524,-3.842462588,-4.744620955,-7.774299145,-6.959176653,-11.09727955,-12.62502407,-10.12398398,-9.332931837,-4.227119369,-0.074726049,-0.799772509,-2.731535902,-5.83340023,-5.167421593,-7.861774015,-9.951062137,-7.598486167,-7.807001177,-2.899870807 +050,1,2,42,051,Pennsylvania,Fayette County,136606,136589,136431,136008,135283,134610,134009,133272,132371,131340,130452,129422,128126,-158,-423,-725,-673,-601,-737,-901,-1031,-888,-1030,-1296,352,1384,1337,1368,1384,1407,1384,1321,1304,1279,1284,475,1826,1755,1800,1739,1804,1755,1881,1838,1783,1938,-123,-442,-418,-432,-355,-397,-371,-560,-534,-504,-654,4,25,5,85,86,104,58,50,60,11,22,-20,4,-293,-309,-311,-433,-583,-515,-412,-540,-664,-16,29,-288,-224,-225,-329,-525,-465,-352,-529,-642,-19,-10,-19,-17,-21,-11,-5,-6,-2,3,0,4216,4216,4236,4243,4227,4245,4246,4261,4341,4373,4261,4259,10.16007253,9.8565746744,10.137350728,10.304557757,10.528245554,10.419999774,10.018543026,9.9621073218,9.84323172,9.9709568702,13.404835578,12.93813654,13.338619379,12.947706603,13.498901905,13.213222257,14.265616527,14.041681946,13.722034524,15.049621818,-3.244763048,-3.081561865,-3.201268651,-2.643148847,-2.97065635,-2.793222483,-4.247073501,-4.079574624,-3.878802804,-5.078664948,0.1835273217,0.0368607879,0.6298792484,0.6403121149,0.7782072052,0.4366762911,0.3792029912,0.4583791713,0.0846564104,0.1708419401,0.0293643715,-2.160042169,-2.289796327,-2.315547299,-3.240035768,-4.389349616,-3.905790809,-3.147536976,-4.155860148,-5.156320375,0.2128916932,-2.123181381,-1.659917078,-1.675235184,-2.461828562,-3.952673325,-3.526587818,-2.689157805,-4.071203737,-4.985478435 +050,1,2,42,053,Pennsylvania,Forest County,7716,7707,7704,7672,7587,7532,7459,7386,7334,7328,7294,7030,6965,-3,-32,-85,-55,-73,-73,-52,-6,-34,-264,-65,7,39,38,38,36,44,22,29,17,19,15,10,97,91,87,85,92,75,93,86,72,82,-3,-58,-53,-49,-49,-48,-53,-64,-69,-53,-67,0,3,3,3,3,4,6,8,12,0,3,1,23,-36,-9,-27,-29,-6,50,22,-212,-1,1,26,-33,-6,-24,-25,0,58,34,-212,2,-1,0,1,0,0,0,1,0,1,1,0,2500,2500,2546,2533,2504,2526,2555,2564,2637,2646,2431,2430,5.0728407908,4.9806671473,5.0267874859,4.802881729,5.9279218592,2.9891304348,3.9558041195,2.3252633019,2.6528902541,2.1436227224,12.617065557,11.927387116,11.508697665,11.340137416,12.394745706,10.190217391,12.68585459,11.763096704,10.053057805,11.718470882,-7.544224766,-6.946719969,-6.481910179,-6.537255687,-6.466823846,-7.201086957,-8.730050471,-9.437833402,-7.400167551,-9.57484816,0.3902185224,0.3932105643,0.3968516436,0.4002401441,0.5389019872,0.8152173913,1.0912563088,1.6413623307,0,0.4287245445,2.9916753382,-4.718526771,-1.190554931,-3.602161297,-3.907039407,-0.815217391,6.8203519302,3.009164273,-29.6006702,-0.142908181,3.3818938606,-4.325316207,-0.793703287,-3.201921153,-3.36813742,0,7.911608239,4.6505266037,-29.6006702,0.285816363 +050,1,2,42,055,Pennsylvania,Franklin County,149618,149625,149925,150949,151518,152005,152685,153131,153938,154731,154943,155522,155637,300,1024,569,487,680,446,807,793,212,579,115,495,1862,1938,1785,1887,1857,1862,1826,1733,1740,1717,294,1395,1387,1434,1407,1577,1546,1592,1692,1600,1763,201,467,551,351,480,280,316,234,41,140,-46,41,187,182,164,189,173,344,289,324,150,152,76,376,-135,3,48,16,158,280,-148,289,3,117,563,47,167,237,189,502,569,176,439,155,-18,-6,-29,-31,-37,-23,-11,-10,-5,0,6,2696,2695,2696,2624,2568,2555,2538,2555,2613,2612,2687,2690,12.377274208,12.814621099,11.761876365,12.386359907,12.144557512,12.12756742,11.831444039,11.19241525,11.208992962,11.036158363,9.2729847046,9.1712484337,9.449036811,9.2356165283,10.313391059,10.069398083,10.315256796,10.927620659,10.307119965,11.331827137,3.1042895032,3.6433726654,2.3128395542,3.1507433785,1.831166453,2.0581693365,1.5161872426,0.2647945904,0.901872997,-0.295668774,1.2430452615,1.2034370692,1.0806429826,1.2406052053,1.1313992728,2.2405387714,1.872556039,2.0925231049,0.9662924967,0.9769924701,2.4993851247,-0.892659364,0.0197678594,0.3150743379,0.104638083,1.0290846683,1.814241145,-0.955843887,1.8617235437,0.0192827461,3.7424303861,0.3107777047,1.100410842,1.5556795431,1.2360373558,3.2696234397,3.686797184,1.1366792175,2.8280160405,0.9962752162 +050,1,2,42,057,Pennsylvania,Fulton County,14845,14844,14861,14738,14701,14622,14536,14510,14502,14469,14486,14502,14501,17,-123,-37,-79,-86,-26,-8,-33,17,16,-1,33,129,132,135,137,117,141,140,144,148,144,18,150,123,163,146,165,183,155,170,141,162,15,-21,9,-28,-9,-48,-42,-15,-26,7,-18,0,2,3,5,0,1,1,1,0,0,0,4,-104,-45,-56,-76,23,33,-18,45,11,16,4,-102,-42,-51,-76,24,34,-17,45,11,16,-2,0,-4,0,-1,-2,0,-1,-2,-2,1,122,122,122,122,122,122,122,122,122,122,122,122,8.7165106929,8.9676959136,9.2077891075,9.3970779889,8.0561867383,9.7201158141,9.664837251,9.9464686583,10.211121844,9.9300072406,10.13547755,8.3562621013,11.117552774,10.01440428,11.36128899,12.615469461,10.700355528,11.742358833,9.7281633779,11.171258146,-1.418966857,0.6114338123,-1.909763667,-0.617326291,-3.305102252,-2.895353647,-1.035518277,-1.795890174,0.4829584656,-1.241250905,0.1351397007,0.2038112708,0.3410292262,0,0.0688562969,0.0689369916,0.0690345518,0,0,0,-7.027264435,-3.057169061,-3.819527333,-5.21297757,1.5836948289,2.2749207225,-1.242621932,3.1082714557,0.7589347316,1.1033341378,-6.892124734,-2.853357791,-3.478498107,-5.21297757,1.6525511258,2.343857714,-1.17358738,3.1082714557,0.7589347316,1.1033341378 +050,1,2,42,059,Pennsylvania,Greene County,38686,38692,38616,38377,38048,37880,37781,37431,37222,36875,36639,36062,35621,-76,-239,-329,-168,-99,-350,-209,-347,-236,-577,-441,102,404,404,405,403,402,380,410,346,329,320,145,431,452,439,402,442,445,428,472,424,461,-43,-27,-48,-34,1,-40,-65,-18,-126,-95,-141,1,5,-2,6,3,2,1,1,2,-1,1,-31,-216,-279,-139,-97,-315,-144,-332,-110,-482,-300,-30,-211,-281,-133,-94,-313,-143,-331,-108,-483,-299,-3,-1,0,-1,-6,3,-1,2,-2,1,-1,3076,3076,3016,2993,3089,3012,2962,2990,2971,3120,2967,2968,10.494460535,10.572456657,10.668001264,10.652780164,10.689783545,10.180434812,11.066574895,9.4131730011,9.0507695905,8.9281977596,11.195822997,11.828590121,11.563586556,10.626346466,11.753443599,11.921824977,11.552424525,12.841091493,11.664213697,12.862184897,-0.701362462,-1.256133464,-0.895585291,0.0264336977,-1.063660054,-1.741390165,-0.48584963,-3.427918492,-2.613444107,-3.933987138,0.1298819373,-0.052338894,0.1580444632,0.079301093,0.0531830027,0.0267906179,0.0269916461,0.0544114046,-0.027509938,0.027900618,-5.610899692,-7.301275761,-3.661363397,-2.564068675,-8.376322927,-3.857848981,-8.9612265,-2.992627255,-13.2597901,-8.3701854,-5.481017755,-7.353614655,-3.503318934,-2.484767582,-8.323139924,-3.831058363,-8.934234854,-2.93821585,-13.28730004,-8.342284782 +050,1,2,42,061,Pennsylvania,Huntingdon County,45913,46002,45999,46013,45948,45847,45749,45514,45411,45447,45385,44894,44590,-3,14,-65,-101,-98,-235,-103,36,-62,-491,-304,107,416,414,419,392,404,410,369,385,418,408,117,423,447,469,426,451,475,492,493,529,572,-10,-7,-33,-50,-34,-47,-65,-123,-108,-111,-164,3,9,22,30,29,43,54,38,33,27,18,9,14,-46,-74,-85,-230,-90,123,14,-406,-160,12,23,-24,-44,-56,-187,-36,161,47,-379,-142,-5,-2,-8,-7,-8,-1,-2,-2,-1,-1,2,4682,4682,4810,4823,4874,4874,4827,4769,4891,5016,4781,4778,9.0422988306,9.0038168354,9.1290375293,8.5593257347,8.8535331953,9.0184217762,8.1225648815,8.477188656,9.2601823237,9.1189486389,9.1944528974,9.7215123802,10.218421483,9.3017162321,9.8835234432,10.44817157,10.830086509,10.855205214,11.719225955,12.784408386,-0.152154067,-0.717695545,-1.089383953,-0.742390497,-1.029990248,-1.429749794,-2.707521627,-2.378016558,-2.459043631,-3.665459747,0.1956266574,0.4784636966,0.653630372,0.6332154243,0.9423315035,1.1877921364,0.8364700962,0.7266161705,0.5981457482,0.4023065576,0.3043081337,-1.000424093,-1.612288251,-1.855976244,-5.040377809,-1.979653561,2.7075216272,0.3082614057,-8.994339769,-3.57605829,0.4999347911,-0.521960396,-0.958657879,-1.222760819,-4.098046306,-0.791861424,3.5439917233,1.0348775762,-8.396194021,-3.173751732 +050,1,2,42,063,Pennsylvania,Indiana County,88880,88881,88864,88639,88243,88178,87459,86800,85243,84809,84578,84022,83664,-17,-225,-396,-65,-719,-659,-1557,-434,-231,-556,-358,240,841,816,869,865,794,833,761,809,791,788,233,899,881,879,891,932,866,1017,933,903,961,7,-58,-65,-10,-26,-138,-33,-256,-124,-112,-173,14,79,74,98,99,82,90,73,69,37,37,-30,-244,-398,-146,-802,-605,-1625,-249,-174,-483,-224,-16,-165,-324,-48,-703,-523,-1535,-176,-105,-446,-187,-8,-2,-7,-7,10,2,11,-2,-2,2,2,5357,5357,5346,5402,5711,5594,5531,4697,4843,5062,4925,4926,9.475896182,9.2264899764,9.8514349199,9.8498607924,9.1128722189,9.6836256052,8.9502034672,9.5520907744,9.3831553974,9.3985186599,10.129406264,9.961443222,9.9648001088,10.145925972,10.696721547,10.067250629,11.961047209,11.016193687,10.711743772,11.461899026,-0.653510082,-0.734953246,-0.113365189,-0.29606518,-1.583849328,-0.383625024,-3.010843742,-1.464102912,-1.328588375,-2.063380366,0.8901258007,0.8367160028,1.1109788517,1.127325108,0.9411278614,1.0462500654,0.8585609108,0.814702427,0.4389086595,0.4413010031,-2.749249308,-4.500175258,-1.655131759,-9.132472087,-6.94368727,-18.89062618,-2.928515983,-2.05446699,-5.729537367,-2.671660127,-1.859123508,-3.663459255,-0.544152907,-8.005146979,-6.002559409,-17.84437612,-2.069955073,-1.239764563,-5.290628707,-2.230359124 +050,1,2,42,065,Pennsylvania,Jefferson County,45200,45189,45163,44917,44805,44879,44575,44350,44041,43829,43573,43299,43108,-26,-246,-112,74,-304,-225,-309,-212,-256,-274,-191,124,499,538,540,515,516,479,490,478,451,459,186,556,573,569,539,580,552,581,564,563,554,-62,-57,-35,-29,-24,-64,-73,-91,-86,-112,-95,1,9,5,6,5,3,2,3,1,1,0,41,-197,-74,106,-285,-161,-237,-122,-169,-163,-96,42,-188,-69,112,-280,-158,-235,-119,-168,-162,-96,-6,-1,-8,-9,0,-3,-1,-2,-2,0,0,774,774,774,774,774,774,774,774,775,760,759,759,11.079040853,11.992599362,12.042281789,11.514297851,11.605285353,10.83820751,11.152839422,10.937964806,10.383092366,10.624139248,12.344582593,12.772787053,12.688996923,12.050886489,13.04470059,12.489959385,13.224081029,12.905883161,12.961598674,12.823035171,-1.265541741,-0.780187691,-0.646715133,-0.536588638,-1.439415238,-1.651751875,-2.071241607,-1.967918354,-2.578506308,-2.198895923,0.1998223801,0.1114553844,0.133803131,0.1117892995,0.0674725893,0.045253476,0.0682826903,0.0228827716,0.0230223778,0,-4.373889876,-1.649539689,2.3638553142,-6.371990073,-3.621028957,-5.36253691,-2.776829407,-3.867188394,-3.752647573,-2.222042196,-4.174067496,-1.538084305,2.4976584452,-6.260200774,-3.553556368,-5.317283434,-2.708546717,-3.844305622,-3.729625196,-2.222042196 +050,1,2,42,067,Pennsylvania,Juniata County,24636,24637,24625,24711,24609,24478,24484,24442,24554,24628,24722,24760,24619,-12,86,-102,-131,6,-42,112,74,94,38,-141,73,282,269,287,253,300,278,280,284,286,282,81,233,234,252,249,269,278,253,233,249,271,-8,49,35,35,4,31,0,27,51,37,11,2,37,20,24,32,39,35,38,49,8,12,-4,2,-157,-192,-27,-109,79,11,-6,-6,-164,-2,39,-137,-168,5,-70,114,49,43,2,-152,-2,-2,0,2,-3,-3,-2,-2,0,-1,0,292,292,292,292,292,292,292,292,292,292,292,292,11.431814497,10.908353609,11.693523744,10.334545157,12.263418223,11.347865132,11.386279533,11.509625127,11.559759104,11.421859495,9.4454353819,9.4890510949,10.267484263,10.171153139,10.99619834,11.347865132,10.288316864,9.4427558257,10.064265794,10.976325969,1.9863791146,1.4193025142,1.4260394809,0.1633920183,1.2672198831,0,1.0979626693,2.0668693009,1.4954933107,0.4455335264,1.4999189233,0.8110300081,0.9778556441,1.3071361464,1.594244369,1.4286880562,1.5452807938,1.9858156028,0.323349905,0.4860365743,0.0810766986,-6.366585564,-7.822845152,-1.102896124,-4.455708621,3.2247530411,0.4473181245,-0.243161094,-0.242512429,-6.642499848,1.5809956219,-5.555555556,-6.844989508,0.2042400229,-2.861464252,4.6534410972,1.9925989183,1.7426545086,0.0808374763,-6.156463274 +050,1,2,42,069,Pennsylvania,Lackawanna County,214437,214427,214523,214400,214232,213797,212922,211974,211108,210603,210301,209808,208989,96,-123,-168,-435,-875,-948,-866,-505,-302,-493,-819,570,2191,2252,2185,2191,2205,2212,2207,1974,2051,1987,605,2674,2711,2794,2643,2737,2650,2677,2772,2606,2711,-35,-483,-459,-609,-452,-532,-438,-470,-798,-555,-724,106,473,522,680,800,755,867,808,869,327,373,56,-103,-181,-485,-1228,-1169,-1292,-840,-367,-265,-473,162,370,341,195,-428,-414,-425,-32,502,62,-100,-31,-10,-50,-21,5,-2,-3,-3,-6,0,5,8063,8063,8081,8341,8234,8082,7900,7834,7490,7429,7653,7653,10.216285907,10.507848224,10.209588603,10.269052936,10.379010393,10.456601794,10.466883719,9.3798110733,9.7641326418,9.4890842102,12.468438391,12.649545531,13.055190186,12.38754309,12.883152583,12.527122402,12.695898376,13.171649592,12.406304078,12.94660659,-2.252152484,-2.141697307,-2.845601583,-2.118490154,-2.50414219,-2.070520608,-2.229014657,-3.791838519,-2.642171436,-3.45752238,2.2055240684,2.4356557607,3.1773548054,3.7495400955,3.5538108149,4.0984962726,3.8320081762,4.1292076103,1.5567388463,1.7812926072,-0.480272683,-0.844547304,-2.266201589,-5.755544047,-5.50252297,-6.107563073,-3.983770876,-1.743865585,-1.261577353,-2.258850947,1.7252513854,1.5911084567,0.9111532163,-2.006003951,-1.948712155,-2.0090668,-0.1517627,2.3853420257,0.2951614938,-0.47755834 +050,1,2,42,071,Pennsylvania,Lancaster County,519445,519443,520325,523996,526949,530109,533414,535960,538303,541352,543960,545441,546192,882,3671,2953,3160,3305,2546,2343,3049,2608,1481,751,1742,7022,7048,6908,7016,7187,7154,7048,7117,6887,6879,1044,4504,4548,4928,4676,5060,5049,5154,5220,5141,5565,698,2518,2500,1980,2340,2127,2105,1894,1897,1746,1314,231,1217,1124,1324,1433,1446,1503,1294,1455,512,590,19,-42,-594,-63,-381,-975,-1246,-113,-731,-782,-1165,250,1175,530,1261,1052,471,257,1181,724,-270,-575,-66,-22,-77,-81,-87,-52,-19,-26,-13,5,12,12638,12640,12796,12763,12936,12778,12793,12758,12713,12687,12597,12603,13.447972415,13.412690483,13.070238341,13.193884853,13.441508771,13.318898631,13.056022526,13.115122656,12.643645453,12.603136768,8.6257003354,8.655067582,9.3239916826,8.7934158453,9.4634805035,9.3999327911,9.5474943385,9.6193536974,9.4382142113,10.195734281,4.8222720792,4.7576229013,3.7462466582,4.4004690073,3.978028267,3.9189658398,3.5085281872,3.4957689586,3.2054312416,2.4074024878,2.3307010009,2.1390272564,2.5050659472,2.6948171314,2.7043859305,2.7981974619,2.3970620244,2.681256634,0.9399660915,1.0809493667,-0.080435039,-1.130411201,-0.119198757,-0.71648662,-1.823496737,-2.319729899,-0.209326127,-1.347078075,-1.435651335,-2.13441697,2.2502659623,1.0086160551,2.3858671899,1.978330511,0.8808891931,0.4784675633,2.1877358971,1.3341785588,-0.495685244,-1.053467603 +050,1,2,42,073,Pennsylvania,Lawrence County,91108,91156,91016,90526,89895,89274,88668,88154,87379,86608,86164,85504,85083,-140,-490,-631,-621,-606,-514,-775,-771,-444,-660,-421,208,857,898,864,886,928,920,865,957,835,840,242,1084,1069,1203,1107,1209,1197,1242,1228,1090,1158,-34,-227,-171,-339,-221,-281,-277,-377,-271,-255,-318,7,24,25,22,34,27,44,33,35,18,15,-107,-284,-490,-300,-409,-252,-542,-425,-205,-422,-119,-100,-260,-465,-278,-375,-225,-498,-392,-170,-404,-104,-6,-3,5,-4,-10,-8,0,-2,-3,-1,1,2271,2271,2294,2188,2085,2086,2088,2090,2091,2091,2092,2091,9.4413413976,9.9544953193,9.6445255597,9.9583010194,10.49643144,10.482359442,9.9432716237,11.078183965,9.7280797819,9.8483471777,11.942140111,11.8500618,13.428662324,12.442256466,13.674768977,13.638461144,14.276928736,14.215266363,12.698930494,13.576650038,-2.500798713,-1.895566481,-3.784136765,-2.483955446,-3.178337537,-3.156101702,-4.333657112,-3.137082398,-2.970850712,-3.72830286,0.2644016261,0.2771296024,0.2455781971,0.3821469917,0.305391863,0.5013302342,0.3793386862,0.4051582432,0.2097071091,0.1758633425,-3.128752575,-5.431740208,-3.348793597,-4.597003518,-2.850324055,-6.175476976,-4.885422474,-2.37306971,-4.916466668,-1.395182517,-2.864350949,-5.154610605,-3.1032154,-4.214856526,-2.544932192,-5.674146742,-4.506083788,-1.967911467,-4.706759559,-1.219319174 +050,1,2,42,075,Pennsylvania,Lebanon County,133568,133596,133667,134530,135531,135803,136538,137492,138481,139473,141116,141318,141663,71,863,1001,272,735,954,989,992,1643,202,345,381,1735,1619,1706,1659,1627,1613,1564,1633,1514,1541,382,1419,1395,1453,1398,1396,1472,1549,1534,1559,1628,-1,316,224,253,261,231,141,15,99,-45,-87,56,398,521,569,595,545,597,572,767,109,232,36,156,285,-546,-99,197,260,414,783,138,197,92,554,806,23,496,742,857,986,1550,247,429,-20,-7,-29,-4,-22,-19,-9,-9,-6,0,3,3657,3658,3667,3651,3657,3578,3651,3659,3648,3663,3681,3684,12.938250614,11.989883767,12.574907678,12.183255551,11.874612269,11.68954934,11.253660678,11.639800562,10.721088821,10.891190575,10.581773845,10.330999293,10.710047395,10.266540844,10.188665475,10.667710247,11.145729149,10.934142108,11.039747339,11.506072846,2.3564767689,1.6588844742,1.8648602829,1.9167147069,1.6859467941,1.021839093,0.1079315282,0.7056584542,-0.318658518,-0.614882271,2.9679675761,3.8583875495,4.1940928892,4.369522033,3.9776666788,4.3265102021,4.1157889435,5.4670710541,0.7718617447,1.6396860567,1.1633239745,2.1106342641,-4.024560136,-0.727029716,1.4377987812,1.8842422991,2.9789101794,5.5811168649,0.9772194566,1.3923196257,4.1312915506,5.9690218136,0.169532753,3.6424923166,5.41546546,6.2107525012,7.0946991229,11.048187919,1.7490812013,3.0320056824 +050,1,2,42,077,Pennsylvania,Lehigh County,349497,349508,350008,353317,354673,355273,357591,359689,362357,365772,368452,369308,370802,500,3309,1356,600,2318,2098,2668,3415,2680,856,1494,1009,4150,4082,4067,4139,4112,4181,4258,4375,4322,4307,845,3241,3264,3449,3260,3529,3305,3412,3504,3431,3571,164,909,818,618,879,583,876,846,871,891,736,310,1569,1588,1859,2057,2018,2432,2319,2748,797,1033,75,843,-1017,-1879,-571,-473,-626,272,-936,-841,-288,385,2412,571,-20,1486,1545,1806,2591,1812,-44,745,-49,-12,-33,2,-47,-30,-14,-22,-3,9,13,8954,8954,8860,8773,8757,8778,8848,8903,8968,8974,8976,8979,11.801087691,11.531236317,11.457209422,11.612313148,11.465536471,11.580979605,11.69572974,11.917344026,11.716547387,11.638810447,9.216222941,9.2204692157,9.7162319388,9.1462046056,9.8399509257,9.1545414004,9.3719656819,9.544771078,9.301127738,9.6499169042,2.5848647496,2.3107671012,1.7409774828,2.4661085424,1.6255855454,2.4264382048,2.3237640583,2.3725729478,2.4154196487,1.9888935429,4.4616642377,4.4859390669,5.2370180267,5.7710867711,5.6268124024,6.7364129155,6.3697504151,7.4854540304,2.1605942312,2.7914769426,2.3971848008,-2.872921934,-5.29336034,-1.601988598,-1.318871292,-1.733961548,0.7471203592,-2.54963063,-2.279874214,-0.778262691,6.8588490385,1.613017133,-0.056342313,4.169098173,4.3079411109,5.0024513674,7.1168707743,4.9358233999,-0.119279983,2.0132142519 +050,1,2,42,079,Pennsylvania,Luzerne County,320918,320917,321017,321073,321232,319737,319269,318203,317192,318031,318093,317438,316982,100,56,159,-1495,-468,-1066,-1011,839,62,-655,-456,830,3103,3211,3092,3181,3213,3103,3271,3291,3344,3269,902,4067,3806,4180,4027,4158,3883,4038,4209,4018,4204,-72,-964,-595,-1088,-846,-945,-780,-767,-918,-674,-935,139,669,536,767,1022,1037,1136,1119,1164,648,582,79,368,298,-1153,-599,-1138,-1360,514,-169,-630,-109,218,1037,834,-386,423,-101,-224,1633,995,18,473,-46,-17,-80,-21,-45,-20,-7,-27,-15,1,6,11791,11784,11834,11954,11907,11999,11851,11867,11916,11866,11698,11699,9.6653117164,9.9983652626,9.6478924878,9.9560880493,10.080442749,9.767152716,10.29874548,10.347039256,10.523483512,10.305475868,12.668006043,11.851067639,13.042752458,12.603950511,13.045278851,12.2223184,12.713645444,13.233268985,12.644544483,13.25305003,-3.002694326,-1.852702377,-3.39485997,-2.647862461,-2.964836103,-2.455165684,-2.414899964,-2.886229729,-2.121060971,-2.947574162,2.0838200252,1.6689890317,2.3932514677,3.1987180089,3.2534762311,3.5757284839,3.5231721773,3.6596638391,2.039239628,1.8347466978,1.1462567553,0.9279080811,-3.597677891,-1.874786778,-3.570352894,-4.280801706,1.6183293111,-0.531342946,-1.982594083,-0.343620945,3.2300767805,2.5968971127,-1.204426423,1.3239312307,-0.316876663,-0.705073222,5.1415014885,3.1283208934,0.0566455452,1.4911257527 +050,1,2,42,081,Pennsylvania,Lycoming County,116111,116095,116215,116747,117237,116626,116331,115644,114958,114146,114175,113581,113209,120,532,490,-611,-295,-687,-686,-812,29,-594,-372,345,1244,1292,1314,1246,1270,1207,1148,1237,1180,1169,249,1306,1216,1255,1239,1278,1258,1284,1305,1325,1418,96,-62,76,59,7,-8,-51,-136,-68,-145,-249,14,63,51,62,71,95,160,112,119,65,57,24,532,375,-733,-373,-771,-793,-788,-19,-513,-183,38,595,426,-671,-302,-676,-633,-676,100,-448,-126,-14,-1,-12,1,0,-3,-2,0,-3,-1,3,5437,5437,5500,5511,5461,5481,5310,5285,5258,5326,5269,5276,10.679853367,11.043490153,11.237348362,10.697253141,10.94945576,10.46825266,10.021649557,10.835621778,10.361966315,10.309096521,11.212129017,10.393873085,10.732779448,10.637156213,11.01842871,10.910573195,11.208883302,11.43127439,11.635258786,12.504960536,-0.53227565,0.6496170678,0.5045689143,0.0600969278,-0.06897295,-0.442320535,-1.187233745,-0.595652612,-1.273292471,-2.195864015,0.5408607412,0.4359272429,0.5302249608,0.609554553,0.8190537773,1.3876722665,0.977721908,1.0423920708,0.5707862801,0.5026676661,4.5672684816,3.2053473742,-6.268627359,-3.202307722,-6.647268025,-6.877650671,-6.878971995,-0.166432347,-4.504820949,-1.61382777,5.1081292228,3.6412746171,-5.738402398,-2.592753169,-5.828214247,-5.489978404,-5.901250087,0.8759597234,-3.934034669,-1.111160104 +050,1,2,42,083,Pennsylvania,McKean County,43450,43463,43347,43143,43151,42819,42663,42424,41701,41427,41012,40631,40333,-116,-204,8,-332,-156,-239,-723,-274,-415,-381,-298,117,442,459,449,447,443,384,381,376,357,354,158,529,516,521,523,544,475,490,567,532,540,-41,-87,-57,-72,-76,-101,-91,-109,-191,-175,-186,1,17,13,18,15,12,19,28,26,15,12,-75,-135,61,-279,-86,-146,-652,-192,-252,-221,-126,-74,-118,74,-261,-71,-134,-633,-164,-226,-206,-114,-1,1,-9,1,-9,-4,1,-1,2,0,2,3178,3178,3175,3312,3205,3257,3376,3202,3055,3015,2967,2966,10.220834779,10.638051313,10.445504246,10.458342107,10.412871531,9.1292719168,9.1665864691,9.1218961899,8.7453915216,8.7446272417,12.232628049,11.959116509,12.120507154,12.236494233,12.786912219,11.292719168,11.789048215,13.755625371,13.03234815,13.339261894,-2.011793271,-1.321065196,-1.675002908,-1.778152126,-2.374040688,-2.163447251,-2.622461746,-4.633729182,-4.286956628,-4.594634652,0.3931090299,0.301295571,0.418750727,0.3509510774,0.2820642401,0.4517087667,0.673659898,0.6307694174,0.3674534253,0.2964280421,-3.121748179,1.4137715253,-6.490636268,-2.012119511,-3.431781588,-15.50074294,-4.619382158,-6.113611276,-5.413813799,-3.112494442,-2.728639149,1.7150670962,-6.071885541,-1.661168433,-3.149717348,-15.04903418,-3.94572226,-5.482841859,-5.046360374,-2.8160664 +050,1,2,42,085,Pennsylvania,Mercer County,116638,116663,116607,116169,115660,115162,114724,113684,112651,111526,110575,109296,108545,-56,-438,-509,-498,-438,-1040,-1033,-1125,-951,-1279,-751,301,1134,1093,1081,1113,1119,1155,1144,1075,1061,1053,298,1383,1339,1405,1358,1441,1413,1477,1479,1482,1520,3,-249,-246,-324,-245,-322,-258,-333,-404,-421,-467,4,23,32,46,70,60,70,39,32,18,16,-49,-208,-282,-214,-252,-778,-842,-834,-578,-876,-301,-45,-185,-250,-168,-182,-718,-772,-795,-546,-858,-285,-14,-4,-13,-6,-11,0,-3,3,-1,0,1,6750,6750,6790,6790,6783,6796,6591,6534,6350,6295,6067,6071,9.7432725023,9.4293638846,9.3665248546,9.6830602995,9.7982557529,10.206110412,10.206220977,9.6802805931,9.6511136075,9.6676015993,11.882668316,11.551617787,12.173882905,11.81455156,12.617771707,12.485916893,13.177087748,13.318265114,13.480631825,13.955132413,-2.139395814,-2.122253903,-2.807358051,-2.131491261,-2.819515954,-2.279806482,-2.97086677,-3.637984521,-3.829518218,-4.287530814,0.1976148744,0.2760655483,0.3985755257,0.6089975031,0.5253756436,0.6185521462,0.3479393515,0.2881571897,0.1637323703,0.1468961307,-1.787125821,-2.432827645,-1.854242663,-2.192391011,-6.812370845,-7.440298672,-7.440549209,-5.20483924,-7.96830869,-2.763483458,-1.589510946,-2.156762096,-1.455667137,-1.583393508,-6.286995202,-6.821746526,-7.092609857,-4.91668205,-7.80457632,-2.616587327 +050,1,2,42,087,Pennsylvania,Mifflin County,46682,46677,46638,46745,46755,46636,46498,46435,46289,46270,46181,46090,46064,-39,107,10,-119,-138,-63,-146,-19,-89,-91,-26,144,564,565,588,563,593,558,568,610,609,603,166,516,483,520,540,573,522,568,559,571,564,-22,48,82,68,23,20,36,0,51,38,39,3,21,22,20,26,15,1,1,-2,-2,1,-13,42,-91,-204,-182,-92,-180,-15,-136,-127,-67,-10,63,-69,-184,-156,-77,-179,-14,-138,-129,-66,-7,-4,-3,-3,-5,-6,-3,-5,-2,0,1,559,559,559,559,559,559,559,559,560,560,560,560,12.07928638,12.085561497,12.592219807,12.090106728,12.761882216,12.035718908,12.273252736,13.196179598,13.200247098,13.086789505,11.051262007,10.331550802,11.1359767,11.59619473,12.331464604,11.259220914,12.273252736,12.092892451,12.37658636,12.240380233,1.0280243727,1.7540106952,1.4562431069,0.4939119978,0.4304176127,0.776497994,0,1.1032871467,0.8236607385,0.8464092714,0.4497606631,0.4705882353,0.4283067962,0.5583353018,0.3228132095,0.0215693887,0.0216078393,-0.043266163,-0.043350565,0.0217028018,0.8995213262,-1.946524064,-4.368729321,-3.908347113,-1.979921018,-3.88248997,-0.32411759,-2.942099058,-2.752760889,-1.454087723,1.3492819892,-1.475935829,-3.940422525,-3.350011811,-1.657107809,-3.860920582,-0.302509751,-2.98536522,-2.796111454,-1.432384921 +050,1,2,42,089,Pennsylvania,Monroe County,169842,169837,169852,169921,168675,167435,167387,166602,166324,168033,169524,170083,170154,15,69,-1246,-1240,-48,-785,-278,1709,1491,559,71,333,1383,1327,1353,1381,1395,1437,1511,1532,1523,1521,337,1251,1280,1353,1365,1412,1502,1467,1519,1588,1775,-4,132,47,0,16,-17,-65,44,13,-65,-254,42,242,219,265,396,294,340,313,319,126,135,-9,-304,-1551,-1541,-452,-1062,-552,1362,1171,505,186,33,-62,-1332,-1276,-56,-768,-212,1675,1490,631,321,-14,-1,39,36,-8,0,-1,-10,-12,-7,4,3790,3790,3919,3926,3816,4368,4452,4440,4505,4503,4161,4164,8.1407292516,7.8382497135,8.0509357056,8.2491592548,8.3535685307,8.6325489748,9.038243554,9.0769855165,8.9691908588,8.9408265415,7.3637399087,7.5606327305,8.0509357056,8.1535860845,8.4553682906,9.0230261379,8.7750518159,8.999961488,9.3519862665,10.433903426,0.7769893429,0.2776169831,0,0.0955731702,-0.10179976,-0.390477163,0.2631917382,0.0770240285,-0.382795408,-1.493076885,1.424480462,1.2935770062,1.5768647169,2.365435963,1.7605370237,2.04249593,1.8722503193,1.8900511617,0.7420341748,0.7935644859,-1.789430002,-9.161360441,-9.16961709,-2.699942059,-6.359490881,-3.316052216,8.1469806225,6.9380874934,2.9740258593,1.093355514,-0.36494954,-7.867783435,-7.592752373,-0.334506096,-4.598953858,-1.273556286,10.019230942,8.8281386551,3.7160600341,1.8869199999 +050,1,2,42,091,Pennsylvania,Montgomery County,799874,799839,800881,805333,808782,812750,815966,817432,820106,824533,826995,830397,833869,1042,4452,3449,3968,3216,1466,2674,4427,2462,3402,3472,2275,9158,8950,8997,9228,8804,8864,8719,8627,8491,8467,1729,7202,7043,7479,7220,7579,7429,7699,7902,7759,8416,546,1956,1907,1518,2008,1225,1435,1020,725,732,51,457,2172,1888,2287,2603,2291,2713,1989,1731,1066,855,148,363,-186,291,-1289,-1990,-1442,1482,36,1610,2549,605,2535,1702,2578,1314,301,1271,3471,1767,2676,3404,-109,-39,-160,-128,-106,-60,-32,-64,-30,-6,17,21018,21019,21296,21562,22094,21734,21588,21461,21658,20720,20806,20808,11.403212772,11.089668332,11.096913289,11.331625649,10.779981364,10.826008312,10.602934747,10.447294869,10.246218155,10.175056151,8.9676718046,8.7267635825,9.2246098134,8.8658796254,9.2800407494,9.0733772285,9.3625409588,9.5693200479,9.3629026808,10.113767871,2.4355409678,2.3629047497,1.872303476,2.4657460232,1.4999406146,1.752631084,1.2403937885,0.8779748209,0.8833154739,0.0612882796,2.7044964121,2.339362437,2.820789229,3.1963829176,2.8051950596,3.3135108926,2.4187678877,2.0962405724,1.2863583268,1.0274799822,0.4519945661,-0.23046685,0.3589198363,-1.582841944,-2.436638223,-1.761180504,1.8022192104,0.0435959911,1.9428113566,3.0632122509,3.1564909782,2.1088955867,3.1797090653,1.6135409734,0.3685568367,1.5523303887,4.2209870981,2.1398365635,3.2291696835,4.0906922331 +050,1,2,42,093,Pennsylvania,Montour County,18267,18256,18298,18363,18429,18398,18418,18297,18241,18255,18172,18181,18042,42,65,66,-31,20,-121,-56,14,-83,9,-139,50,224,212,250,208,232,205,227,204,193,191,37,199,221,228,223,231,227,247,230,225,241,13,25,-9,22,-15,1,-22,-20,-26,-32,-50,11,76,53,24,31,31,35,28,22,14,11,18,-35,26,-76,8,-152,-69,8,-78,27,-98,29,41,79,-52,39,-121,-34,36,-56,41,-87,0,-1,-4,-1,-4,-1,0,-2,-1,0,-2,843,843,843,843,843,843,839,844,844,844,846,845,12.220070375,11.524244401,13.576995139,11.299435028,12.637886422,11.221194373,12.439719421,11.200483158,10.618105796,10.545785827,10.856223234,12.013481192,12.382219567,12.114298131,12.583412774,12.425420111,13.535729943,12.627995717,12.378620747,13.306462745,1.36384714,-0.489236791,1.1947755723,-0.814863103,0.0544736484,-1.204225738,-1.096010522,-1.427512559,-1.760514951,-2.760676918,4.1460953056,2.8810611002,1.3033915334,1.6840504129,1.6886830996,1.9158136734,1.5344147304,1.2078952425,0.7702252909,0.607348922,-1.909385996,1.4133507284,-4.127406522,0.4345936549,-8.279994553,-3.776889813,0.4384042087,-4.282537678,1.4854344896,-5.410926759,2.2367093096,4.2944118287,-2.824014989,2.1186440678,-6.591311453,-1.86107614,1.9728189391,-3.074642436,2.2556597805,-4.803577837 +050,1,2,42,095,Pennsylvania,Northampton County,297735,297704,297941,298305,299099,299066,299748,300264,301629,303178,304949,305515,305892,237,364,794,-33,682,516,1365,1549,1771,566,377,725,2861,2921,2861,2851,2784,2854,2747,2865,2903,2894,703,2820,2695,2874,2890,3040,2996,3010,3136,3114,3214,22,41,226,-13,-39,-256,-142,-263,-271,-211,-320,146,605,532,586,685,660,842,750,848,233,317,113,-275,101,-577,91,149,685,1085,1216,545,369,259,330,633,9,776,809,1527,1835,2064,778,686,-44,-7,-65,-29,-55,-37,-20,-23,-22,-1,11,10620,10620,10673,10867,10790,10751,11035,11193,11241,11233,11163,11165,9.5967100828,9.7789770407,9.5659224461,9.5221554606,9.2798144037,9.4834131648,9.0838895714,9.4223739449,9.5107983436,9.4666891285,9.4591829547,9.0223701214,9.6093887138,9.6524129362,10.133130671,9.9552578282,9.9535885001,10.313635145,10.202075798,10.513455031,0.1375271281,0.7566069193,-0.043466268,-0.130257476,-0.853316267,-0.471844663,-0.869698929,-0.8912612,-0.691277455,-1.046765902,2.029363719,1.7810392967,1.9593256041,2.2878556614,2.1999560009,2.7978394831,2.480130025,2.7888911362,0.7633537768,1.0369524719,-0.922438054,0.3381296409,-1.929233573,0.3039341098,0.4966567335,2.2761520735,3.5879214361,3.9991646482,1.7855270745,1.207051931,1.1069256649,2.1191689376,0.0300920315,2.5917897711,2.6966127344,5.0739915566,6.068051461,6.7880557844,2.5488808513,2.244004403 +050,1,2,42,097,Pennsylvania,Northumberland County,94528,94468,94287,94392,94413,93884,93604,92895,92336,91766,91124,90684,90258,-181,105,21,-529,-280,-709,-559,-570,-642,-440,-426,234,1019,909,981,931,972,968,899,924,898,882,310,1235,1153,1220,1092,1196,1154,1210,1195,1148,1174,-76,-216,-244,-239,-161,-224,-186,-311,-271,-250,-292,10,56,46,44,5,14,27,40,61,-2,14,-109,269,230,-326,-103,-493,-398,-295,-430,-186,-152,-99,325,276,-282,-98,-479,-371,-255,-369,-188,-138,-6,-4,-11,-8,-21,-6,-2,-4,-2,-2,4,3446,3446,3505,3726,3706,3736,3690,3687,3726,3725,3564,3566,10.801414042,9.6289822833,10.419709289,9.93130227,10.423648384,10.451814221,9.7663251893,10.104434359,9.878553199,9.7489803362,13.091017018,12.213659596,12.958252123,11.64874552,12.825806036,12.460117367,13.144887073,13.06796435,12.628707208,12.976533917,-2.289602976,-2.584677313,-2.538542834,-1.71744325,-2.402157652,-2.008303146,-3.378561884,-2.963529991,-2.750154009,-3.227553581,0.5936007717,0.4872752311,0.4673467979,0.0533367469,0.1501348533,0.291527876,0.4345417214,0.6670676363,-0.022001232,0.1547457196,2.8514037068,2.4363761553,-3.462614912,-1.098736986,-5.286891619,-4.297336839,-3.204745196,-4.702280059,-2.046114582,-1.680096384,3.4450044785,2.9236513864,-2.995268114,-1.045400239,-5.136756765,-4.005808963,-2.770203474,-4.035212423,-2.068115814,-1.525350665 +050,1,2,42,099,Pennsylvania,Perry County,45969,45927,45920,45924,45807,45650,45661,45849,45937,46043,46147,46326,46212,-7,4,-117,-157,11,188,88,106,104,179,-114,119,599,538,567,541,557,525,530,513,495,493,104,417,439,441,424,480,457,465,487,443,499,15,182,99,126,117,77,68,65,26,52,-6,2,11,5,10,11,16,20,12,17,3,5,-21,-189,-217,-293,-113,101,1,33,63,126,-116,-19,-178,-212,-283,-102,117,21,45,80,129,-111,-3,0,-4,0,-4,-6,-1,-4,-2,-2,3,657,657,657,657,657,657,657,658,659,658,660,659,13.043856975,11.729949526,12.399269602,11.849612862,12.173532947,11.439653106,11.524244401,11.129189717,10.705827647,10.655082236,9.0806149558,9.5714643904,9.6438763572,9.2869424275,10.490656759,9.9579456562,10.110893673,10.565137217,9.5811750457,10.784758694,3.9632420191,2.1584851359,2.7553932449,2.562670434,1.6828761884,1.4817074499,1.4133507284,0.5640525003,1.1246526013,-0.129676457,0.2395366055,0.1090144008,0.2186820036,0.2409348271,0.3496885586,0.4357963088,0.2609262883,0.3688035579,0.0648838039,0.1080637144,-4.115674404,-4.731224995,-6.407382704,-2.47505777,2.2074090263,0.0217898154,0.7175472929,1.3667425968,2.7251197647,-2.507078173,-3.876137799,-4.622210594,-6.188700701,-2.234122942,2.557097585,0.4575861242,0.9784735812,1.7355461547,2.7900035686,-2.399014459 +050,1,2,42,101,Pennsylvania,Philadelphia County,1526006,1525999,1528303,1540615,1552087,1558713,1565949,1571679,1576604,1581699,1586422,1584439,1578487,2304,12312,11472,6626,7236,5730,4925,5095,4723,-1983,-5952,5582,23301,23194,23018,23151,22700,21703,21347,21124,20452,20478,3457,14311,14305,14104,13862,14079,13925,14545,14216,15231,16685,2125,8990,8889,8914,9289,8621,7778,6802,6908,5221,3793,1576,8456,7721,8586,9920,8946,10314,9085,9198,4368,4153,-1226,-5097,-4833,-10777,-11877,-11774,-13128,-10697,-11302,-11540,-13894,350,3359,2888,-2191,-1957,-2828,-2814,-1612,-2104,-7172,-9741,-171,-37,-305,-97,-96,-63,-39,-95,-81,-32,-4,57383,57373,57011,57497,57755,57229,56669,56457,56558,56358,55161,55137,15.185156462,14.999181945,14.798765591,14.818242741,14.469529211,13.787197657,13.518019012,13.33534925,12.899966287,12.948769589,9.3264140652,9.2508104564,9.0677639192,8.8726396647,8.9742952319,8.8460916633,9.2106425508,8.9744047023,9.6068544159,10.550357485,5.8587423972,5.7483714887,5.7310016716,5.9456030764,5.4952339793,4.9411059933,4.3073764613,4.3609445473,3.2931118709,2.3984121032,5.5107370089,4.9930449167,5.5201234409,6.3494867605,5.7023968425,6.5521428664,5.7530895547,5.8065964021,2.755087656,2.6260494239,-3.32169188,-3.125422365,-6.928764305,-7.602102243,-7.505032464,-8.339783939,-6.773890915,-7.134828499,-7.278780117,-8.785535925,2.1890451293,1.8676225514,-1.408640864,-1.252615483,-1.802635622,-1.787641073,-1.020801361,-1.328232097,-4.523692461,-6.159486501 +050,1,2,42,103,Pennsylvania,Pike County,57369,57359,57382,57104,56334,56126,55717,55410,55040,55492,55868,55826,56072,23,-278,-770,-208,-409,-307,-370,452,376,-42,246,79,294,315,294,300,367,406,405,435,402,418,65,345,431,419,402,451,498,521,528,569,569,14,-51,-116,-125,-102,-84,-92,-116,-93,-167,-151,6,52,46,61,68,60,32,29,35,3,10,12,-279,-717,-147,-376,-286,-310,542,437,124,390,18,-227,-671,-86,-308,-226,-278,571,472,127,400,-9,0,17,3,1,3,0,-3,-3,-2,-3,478,478,478,478,478,478,478,478,477,477,477,477,5.1359991615,5.5536945292,5.228525698,5.364662965,6.6050554771,7.3517428701,7.32819455,7.8125,7.1982380432,7.4710897424,6.0269377915,7.598864578,7.4515383247,7.1886483732,8.116839292,9.0176550475,9.4271342236,9.4827586207,10.188550862,10.169976228,-0.89093863,-2.045170049,-2.223012627,-1.823985408,-1.511783815,-1.665912177,-2.098939674,-1.670258621,-2.990312819,-2.698886486,0.908408015,0.811015709,1.0848301618,1.2159902721,1.0798455821,0.5794477139,0.5247349184,0.628591954,0.0537181944,0.1787342044,-4.873958388,-12.64126659,-2.614262849,-6.723710916,-5.147263941,-5.613399728,9.8071146817,7.8484195402,2.2203520332,6.9706339702,-3.965550373,-11.83025089,-1.529432687,-5.507720644,-4.067418359,-5.033952014,10.3318496,8.4770114943,2.2740702276,7.1493681746 +050,1,2,42,105,Pennsylvania,Potter County,17457,17445,17451,17448,17556,17446,17183,17078,16953,16839,16626,16545,16453,6,-3,108,-110,-263,-105,-125,-114,-213,-81,-92,50,191,195,220,188,192,178,175,178,150,158,59,187,198,212,208,199,228,196,237,194,230,-9,4,-3,8,-20,-7,-50,-21,-59,-44,-72,0,1,1,3,5,3,7,5,5,4,3,18,-6,108,-120,-253,-100,-82,-96,-158,-41,-23,18,-5,109,-117,-248,-97,-75,-91,-153,-37,-20,-3,-2,2,-1,5,-1,0,-2,-1,0,0,217,217,217,217,217,217,217,217,217,217,217,217,10.945872375,11.141583819,12.570710245,10.857951428,11.208079157,10.461050219,10.357481061,10.637979979,9.0440444967,9.5763379599,10.716639445,11.312992801,12.113593509,12.013052644,11.616707043,13.399547471,11.600378788,14.164051995,11.696964216,13.940238802,0.2292329293,-0.171408982,0.4571167362,-1.155101216,-0.408627886,-2.938497253,-1.242897727,-3.526072016,-2.652919719,-4.363900842,0.0573082323,0.0571363273,0.1714187761,0.2887753039,0.1751262368,0.4113896154,0.2959280303,0.2988196623,0.2411745199,0.1818292018,-0.343849394,6.1707233459,-6.856751043,-14.61203038,-5.837541228,-4.819135494,-5.681818182,-9.44270133,-2.472038829,-1.39402388,-0.286541162,6.2278596732,-6.685332267,-14.32325508,-5.662414991,-4.407745879,-5.385890152,-9.143881667,-2.230864309,-1.212194678 +050,1,2,42,107,Pennsylvania,Schuylkill County,148289,148281,148280,147536,147131,146674,145405,144136,143492,142550,141758,141166,140709,-1,-744,-405,-457,-1269,-1269,-644,-942,-792,-592,-457,366,1440,1459,1426,1437,1401,1356,1359,1310,1255,1261,417,1939,1951,2014,1912,1988,1928,2052,1976,1808,1882,-51,-499,-492,-588,-475,-587,-572,-693,-666,-553,-621,14,74,66,52,64,49,32,21,32,-2,4,54,-314,53,103,-863,-729,-94,-263,-153,-36,158,68,-240,119,155,-799,-680,-62,-242,-121,-38,162,-18,-5,-32,-24,5,-2,-10,-7,-5,-1,2,6780,6782,6809,7002,7067,6853,6608,6762,6796,6721,6570,6566,9.7357817021,9.90270373,9.7071186671,9.8398036148,9.6773859315,9.4288455922,9.50210109,9.215357992,8.8716404405,8.9472283814,13.1095005,13.242066468,13.709773489,13.092348303,13.732079395,13.406205237,14.347543368,13.900417857,12.780817463,13.353436807,-3.373718798,-3.339362738,-4.002654822,-3.252544688,-4.054693463,-3.977359645,-4.845442278,-4.685059865,-3.909177023,-4.406208426,0.5003110041,0.4479632942,0.3539762768,0.4382376001,0.3384667456,0.2225096305,0.1468315842,0.2251079815,-0.014138072,0.0283813747,-2.122941288,0.3597280999,0.7011453175,-5.909360139,-5.035556277,-0.65362204,-1.838890792,-1.076297536,-0.254485303,1.1210643016,-1.622630284,0.807691394,1.0551215943,-5.471122539,-4.697089531,-0.431112409,-1.692059208,-0.851189555,-0.268623376,1.1494456763 +050,1,2,42,109,Pennsylvania,Snyder County,39702,39719,39709,39785,39886,40133,40246,40530,40457,40621,40474,40393,40317,-10,76,101,247,113,284,-73,164,-147,-81,-76,99,401,395,422,383,443,462,466,394,440,409,111,327,329,368,366,320,339,362,380,361,416,-12,74,66,54,17,123,123,104,14,79,-7,3,23,29,34,26,13,18,9,9,4,7,4,-19,15,159,81,151,-213,54,-170,-163,-76,7,4,44,193,107,164,-195,63,-161,-159,-69,-5,-2,-9,0,-11,-3,-1,-3,0,-1,0,2317,2317,2289,2372,2470,2467,2592,2602,2651,2657,2684,2684,10.088811734,9.9157786397,10.54749497,9.5298523246,10.968604536,11.40923852,11.495103481,9.7169985819,10.882065614,10.135051419,8.2270360027,8.2589649935,9.1978155188,9.1068562684,7.9231454888,8.3717139788,8.9296726609,9.3717245206,8.9282401969,10.308511956,1.8617757315,1.6568136461,1.3496794511,0.4229960562,3.0454590472,3.037524541,2.5654308197,0.3452740613,1.953825417,-0.173460538,0.5786600247,0.7279938748,0.8497981729,0.6469351448,0.3218777855,0.4445157865,0.2220084363,0.2219618965,0.0989278692,0.1734605377,-0.478023499,0.3765485559,3.9740561617,2.0154517971,3.7387342775,-5.260103473,1.3320506179,-4.192613601,-4.031310671,-1.883285838,0.100636526,1.1045424307,4.8238543346,2.6623869419,4.060612063,-4.815587687,1.5540590542,-3.970651705,-3.932382801,-1.7098253 +050,1,2,42,111,Pennsylvania,Somerset County,77742,77736,77763,77287,77028,76607,76167,75404,74890,74273,73951,73442,72916,27,-476,-259,-421,-440,-763,-514,-617,-322,-509,-526,215,635,695,670,702,643,696,693,713,715,705,171,1002,862,1028,983,1005,973,1044,948,940,999,44,-367,-167,-358,-281,-362,-277,-351,-235,-225,-294,2,19,25,41,50,34,34,33,33,16,14,-9,-124,-104,-93,-200,-432,-268,-298,-118,-299,-246,-7,-105,-79,-52,-150,-398,-234,-265,-85,-283,-232,-10,-4,-13,-11,-9,-3,-3,-1,-2,-1,0,4533,4533,4591,4743,4931,4955,4963,5034,4977,5016,4869,4863,8.1909061593,9.0075494929,8.7219709051,9.1900454266,8.4844726234,9.2618467803,9.2918485147,9.620574266,9.7019532814,9.633911368,12.924862947,11.171953472,13.382367299,12.868681844,13.261111954,12.947955341,13.998109451,12.791450777,12.755015503,13.651457385,-4.733956788,-2.164403979,-4.660396394,-3.678636417,-4.776639331,-3.686108561,-4.706260936,-3.170876511,-3.053062221,-4.017546017,0.2450822315,0.3240125717,0.5337325479,0.6545616401,0.4486346333,0.4524465381,0.4424689769,0.4452720207,0.2171066469,0.1913117151,-1.599484037,-1.347892298,-1.210661633,-2.61824656,-5.70029887,-3.5663433,-3.995628943,-1.592184801,-4.057180463,-3.361620137,-1.354401806,-1.023879727,-0.676929085,-1.96368492,-5.251664237,-3.113896762,-3.553159966,-1.146912781,-3.840073816,-3.170308422 +050,1,2,42,113,Pennsylvania,Sullivan County,6428,6431,6410,6417,6405,6303,6280,6266,6123,6136,6057,5959,5913,-21,7,-12,-102,-23,-14,-143,13,-79,-98,-46,16,54,67,39,60,50,45,50,45,36,39,40,123,109,107,115,94,101,90,92,100,110,-24,-69,-42,-68,-55,-44,-56,-40,-47,-64,-71,0,8,5,7,7,4,2,2,3,-1,0,3,68,27,-43,25,27,-89,51,-36,-32,25,3,76,32,-36,32,31,-87,53,-33,-33,25,0,0,-2,2,0,-1,0,0,1,-1,0,434,430,430,429,433,436,441,438,439,439,371,371,8.4197396118,10.450787709,6.1378659112,9.5366764683,7.970667942,7.2645088385,8.1572722082,7.3812843435,5.9920106525,6.5700808625,19.178295782,17.002027765,16.839785962,18.278629897,14.984855731,16.304786504,14.683089975,15.090625769,16.644474035,18.530997305,-10.75855617,-6.551240056,-10.70192005,-8.741953429,-7.014187789,-9.040277666,-6.525817767,-7.709341425,-10.65246338,-11.96091644,1.2473688314,0.7799095305,1.1016682405,1.1126122546,0.6376534354,0.3228670595,0.3262908883,0.4920856229,-0.16644474,0,10.602635067,4.2115114647,-6.76739062,3.9736151951,4.3041606887,-14.36758415,8.3204176523,-5.905027475,-5.326231691,4.2115902965,11.850003898,4.9914209952,-5.66572238,5.0862274497,4.941814124,-14.04471709,8.6467085407,-5.412941852,-5.492676431,4.2115902965 +050,1,2,42,115,Pennsylvania,Susquehanna County,43356,43318,43333,43222,42923,42399,42089,41778,41268,40939,40565,40241,40006,15,-111,-299,-524,-310,-311,-510,-329,-374,-324,-235,107,354,395,345,395,377,380,361,376,379,376,90,479,446,452,444,437,467,507,471,532,501,17,-125,-51,-107,-49,-60,-87,-146,-95,-153,-125,0,6,6,-1,3,2,10,4,4,2,2,5,10,-253,-418,-265,-252,-434,-185,-284,-172,-112,5,16,-247,-419,-262,-250,-424,-181,-280,-170,-110,-7,-2,-1,2,1,-1,1,-2,1,-1,0,282,282,282,282,282,282,282,282,282,282,282,282,8.1797700884,9.1705844797,8.0870115562,9.3504402992,8.9904253163,9.1515545601,8.7827070687,9.2265410287,9.3804915477,9.3710668312,11.068106984,10.354634628,10.595157169,10.510368336,10.421262237,11.246778894,12.334716022,11.557714959,13.167339059,12.486448092,-2.888336896,-1.184050148,-2.508145613,-1.159928037,-1.43083692,-2.095224334,-3.552008953,-2.33117393,-3.786847511,-3.11538126,0.138640171,0.1393000174,-0.023440613,0.0710160023,0.047694564,0.2408303832,0.0973153138,0.0981546918,0.0495012747,0.0498461002,0.2310669516,-5.873817401,-9.79817632,-6.273080201,-6.009515066,-10.45203863,-4.500833262,-6.968983117,-4.257109621,-2.791381609,0.3697071226,-5.734517383,-9.821616933,-6.202064198,-5.961820502,-10.21120825,-4.403517949,-6.870828426,-4.207608346,-2.741535509 +050,1,2,42,117,Pennsylvania,Tioga County,41981,41931,42002,42278,42486,42252,41940,41562,41295,40729,40725,40665,40381,71,276,208,-234,-312,-378,-267,-566,-4,-60,-284,115,448,411,452,429,455,426,399,406,396,379,83,480,381,462,465,438,439,482,484,478,520,32,-32,30,-10,-36,17,-13,-83,-78,-82,-141,2,10,5,6,10,9,16,14,11,7,4,40,298,176,-228,-288,-408,-269,-500,65,17,-148,42,308,181,-222,-278,-399,-253,-486,76,24,-144,-3,0,-3,-2,2,4,-1,3,-2,-2,1,1864,1864,1843,1828,1764,1700,1486,1416,1321,1241,1314,1314,10.631229236,9.6975130952,10.668177205,10.190992018,10.897942564,10.28277635,9.7288598459,9.9688167555,9.7309251751,9.3527132739,11.390602753,8.989665424,10.904198825,11.04618016,10.490766688,10.596569994,11.752657759,11.884008152,11.745914732,12.83221874,-0.759373517,0.7078476712,-0.23602162,-0.855188141,0.407175876,-0.313793644,-2.023797913,-1.915191396,-2.014989556,-3.479505466,0.237304224,0.1179746119,0.1416129717,0.2375522615,0.2155636991,0.3862075624,0.3413635034,0.2700910944,0.1720113036,0.0987093749,7.0716658757,4.1527063376,-5.381292926,-6.841505131,-9.772221025,-6.493114643,-12.19155369,1.5959928303,0.4177417373,-3.652246872,7.3089700997,4.2706809495,-5.239679955,-6.60395287,-9.556657326,-6.106907081,-11.85019019,1.8660839247,0.5897530409,-3.553537497 +050,1,2,42,119,Pennsylvania,Union County,44947,44968,45005,45130,45195,44773,45017,45573,45527,44744,45090,44498,44294,37,125,65,-422,244,556,-46,-783,346,-592,-204,93,425,375,418,386,419,404,386,406,409,401,76,406,360,375,364,350,391,382,396,374,463,17,19,15,43,22,69,13,4,10,35,-62,9,40,42,47,80,47,57,55,72,2,15,17,68,14,-529,151,434,-116,-852,263,-631,-159,26,108,56,-482,231,481,-59,-797,335,-629,-144,-6,-2,-6,17,-9,6,0,10,1,2,2,9109,9120,9140,9165,8806,8869,9366,9213,8470,8851,8335,8328,9.430298996,8.3033490174,9.2921927797,8.5978394031,9.2504691467,8.8693743139,8.5520266752,9.03889396,9.1306871456,9.0323452563,9.0087091585,7.9712150567,8.3362973502,8.1078071055,7.7271221989,8.5839736553,8.4634046371,8.8162611038,8.3493324999,10.428867466,0.4215898375,0.3321339607,0.9558954295,0.4900322976,1.5233469478,0.2854006586,0.0886220381,0.2226328562,0.7813546457,-1.396522209,0.8875575526,0.92997509,1.0448159346,1.7819356276,1.0376421239,1.2513721186,1.2185530237,1.6029565643,0.0446488369,0.3378682764,1.5088478394,0.3099916967,-11.7597368,3.363403497,9.5816315267,-2.546652031,-18.87649411,5.8552441169,-14.08670804,-3.58140373,2.3964053919,1.2399667866,-10.71492086,5.1453391246,10.619273651,-1.295279912,-17.65794109,7.4582006813,-14.0420592,-3.243535454 +050,1,2,42,121,Pennsylvania,Venango County,54984,54988,54972,54679,54185,53814,53351,52962,52487,51800,51283,50875,50328,-16,-293,-494,-371,-463,-389,-475,-687,-517,-408,-547,158,561,529,578,540,525,535,512,450,491,447,129,694,653,650,633,657,635,663,650,640,723,29,-133,-124,-72,-93,-132,-100,-151,-200,-149,-276,1,5,1,1,3,5,5,7,7,3,4,-41,-164,-371,-299,-373,-260,-378,-543,-324,-261,-274,-40,-159,-370,-298,-370,-255,-373,-536,-317,-258,-270,-5,-1,0,-1,0,-2,-2,0,0,-1,-1,1297,1297,1297,1298,1300,1300,1301,1300,1302,1302,1302,1302,10.23246482,9.718547913,10.703802813,10.07791723,9.8764967596,10.147085321,9.8190570253,8.7308285556,9.612560935,8.8337302254,12.658343289,11.996619636,12.037148492,11.813558531,12.359730231,12.043736783,12.714911734,12.611196803,12.529610995,14.288113989,-2.425878469,-2.278071723,-1.333345679,-1.735641301,-2.483233471,-1.896651462,-2.895854709,-3.880368247,-2.91705006,-5.454383763,0.0911984387,0.0183715461,0.01851869,0.0559884291,0.0940618739,0.0948325731,0.1342449203,0.1358128886,0.0587325515,0.07904904,-2.991308789,-6.815843621,-5.537088306,-6.961228013,-4.891217443,-7.169342526,-10.41357024,-6.28619656,-5.109731984,-5.414859243,-2.90011035,-6.797472075,-5.518569616,-6.905239584,-4.797155569,-7.074509953,-10.27932532,-6.150383671,-5.050999432,-5.335810203 +050,1,2,42,123,Pennsylvania,Warren County,41815,41811,41770,41512,41268,40963,40667,40346,40039,39682,39528,39171,38911,-41,-258,-244,-305,-296,-321,-307,-357,-154,-357,-260,99,399,389,397,383,409,398,388,406,435,400,120,468,511,531,489,508,480,539,493,544,562,-21,-69,-122,-134,-106,-99,-82,-151,-87,-109,-162,0,17,12,11,11,15,11,6,5,4,3,-15,-206,-130,-181,-198,-237,-235,-212,-69,-253,-98,-15,-189,-118,-170,-187,-222,-224,-206,-64,-249,-95,-5,0,-4,-1,-3,0,-1,0,-3,1,-3,788,788,768,769,785,760,760,760,760,759,759,759,9.5819024519,9.3984054119,9.6557259428,9.3838049737,10.097144903,9.9023449649,9.7339471407,10.251230905,11.054778333,10.2456392,11.238923177,12.345977289,12.91483747,11.980889379,12.541197092,11.942526591,13.522158528,12.447923242,13.824826237,14.395123076,-1.657020725,-2.947571877,-3.259111527,-2.597084405,-2.444052189,-2.040181626,-3.788211387,-2.196692337,-2.770047904,-4.149483876,0.4082514829,0.2899251027,0.267539006,0.269508759,0.3703109378,0.273682901,0.1505249558,0.126246686,0.1016531341,0.076842294,-4.947047381,-3.140855279,-4.402232735,-4.851157663,-5.850912816,-5.846861977,-5.318548438,-1.742204267,-6.429560731,-2.510181604,-4.538795898,-2.850930176,-4.134693729,-4.581648904,-5.480601879,-5.573179076,-5.168023482,-1.615957581,-6.327907597,-2.43333931 +050,1,2,42,125,Pennsylvania,Washington County,207820,207852,207944,208089,208350,208117,208050,207824,207469,207152,207114,206866,206803,92,145,261,-233,-67,-226,-355,-317,-38,-248,-63,497,1931,2054,1983,2035,1992,1983,1944,1995,2011,2026,536,2496,2464,2586,2499,2598,2515,2657,2558,2509,2691,-39,-565,-410,-603,-464,-606,-532,-713,-563,-498,-665,14,83,114,118,154,119,107,65,59,30,33,141,634,597,279,291,293,84,347,474,224,568,155,717,711,397,445,412,191,412,533,254,601,-24,-7,-40,-27,-48,-32,-14,-16,-8,-4,1,5925,5925,5912,5642,5665,5617,5511,5534,5488,5477,5314,5316,9.2829174609,9.864590012,9.5229634041,9.7797278496,9.5798246584,9.5498840578,9.3772384901,9.631492809,9.7154451906,9.7952710984,11.999048152,11.833665915,12.418751066,12.009601915,12.494168907,12.111930613,12.816524006,12.349553186,12.12135852,13.010402036,-2.716130692,-1.969075903,-2.895787661,-2.229874065,-2.914344248,-2.562046555,-3.439285516,-2.718060377,-2.405913329,-3.215130938,0.3990068096,0.5474991535,0.566671549,0.7400875129,0.5722887221,0.5152988372,0.3135393528,0.2848411407,0.1449345379,0.1595478511,3.0478351477,2.8671666198,1.3398420523,1.3984770537,1.409080635,0.4045336666,1.6738177758,2.2883847576,1.082177883,2.7461569516,3.4468419572,3.4146657734,1.9065136013,2.1385645666,1.9813693571,0.9198325038,1.9873571286,2.5732258983,1.2271124209,2.9057048026 +050,1,2,42,127,Pennsylvania,Wayne County,52822,52844,52840,52732,52244,52204,52064,51828,51350,51193,51364,51271,51163,-4,-108,-488,-40,-140,-236,-478,-157,171,-93,-108,113,411,420,411,424,424,424,402,386,386,374,143,593,598,644,596,607,599,654,618,597,664,-30,-182,-178,-233,-172,-183,-175,-252,-232,-211,-290,0,5,1,7,7,8,6,2,2,1,1,32,71,-317,187,40,-55,-308,97,402,118,181,32,76,-316,194,47,-47,-302,99,404,119,182,-6,-2,6,-1,-15,-6,-1,-4,-1,-1,0,3820,3820,3909,3696,3882,3907,3883,3750,3723,3859,3750,3748,7.78615542,8.0018289895,7.8699448529,8.1328883262,8.1623224117,8.2188063347,7.8406132062,7.5275212808,7.5218005554,7.3022629205,11.234039329,11.393080323,12.331495098,11.432078874,11.685211566,11.611002345,12.75562447,12.05183459,11.633458372,12.964445399,-3.447883909,-3.391251334,-4.461550245,-3.299190547,-3.522889154,-3.392196011,-4.915011264,-4.524313309,-4.111657817,-5.662182478,0.0947220854,0.0190519738,0.1340379902,0.1342693827,0.1540060832,0.1163038632,0.0390080259,0.0390027009,0.0194865299,0.0195247672,1.3450536127,-6.03947569,3.5807291667,0.7672536157,-1.058791822,-5.970264979,1.8918892562,7.8395428883,2.2994105325,3.5339828573,1.4397756981,-6.020423716,3.7147671569,0.9015229984,-0.904785739,-5.853961116,1.9308972821,7.8785455893,2.3188970624,3.5535076244 +050,1,2,42,129,Pennsylvania,Westmoreland County,365169,365071,365029,364450,362825,360720,358931,357006,354763,352152,350600,348941,347087,-42,-579,-1625,-2105,-1789,-1925,-2243,-2611,-1552,-1659,-1854,824,3187,3153,3181,3163,3194,3070,2931,3052,2844,2801,994,4404,4317,4432,4473,4623,4465,4720,4526,4563,4744,-170,-1217,-1164,-1251,-1310,-1429,-1395,-1789,-1474,-1719,-1943,15,75,90,80,116,102,132,86,83,43,43,170,580,-497,-921,-537,-561,-962,-893,-142,25,45,185,655,-407,-841,-421,-459,-830,-807,-59,68,88,-57,-17,-54,-13,-58,-37,-18,-15,-19,-8,1,7962,7960,8215,8158,7041,7032,7027,7012,6989,6977,6965,6968,8.7377429645,8.670722904,8.7928186913,8.7903719998,8.9225727962,8.6263942375,8.2923689552,8.6858521925,8.1310459287,8.0485267834,12.074370887,11.871712901,12.250792971,12.431025594,12.914544157,12.5462053,13.35379784,12.880788671,13.045697107,13.631635509,-3.336627922,-3.200989997,-3.457974279,-3.640653595,-3.991971361,-3.919811062,-5.061428885,-4.194936478,-4.914651178,-5.583108726,0.2056262072,0.2474992266,0.2211334471,0.3223784862,0.2849412728,0.3709068532,0.2433107234,0.2362141979,0.1229377549,0.1235582477,1.5901760023,-1.366745729,-2.54579881,-1.492390061,-1.567177,-2.703124188,-2.526470651,-0.404125495,0.0714754389,0.1293051429,1.7958022095,-1.119246502,-2.324665363,-1.170011575,-1.282235727,-2.332217335,-2.283159927,-0.167911297,0.1944131938,0.2528633906 +050,1,2,42,131,Pennsylvania,Wyoming County,28276,28291,28250,28319,28391,28144,28176,27822,27557,27409,27070,26790,26557,-41,69,72,-247,32,-354,-265,-148,-339,-280,-233,80,298,300,288,298,289,257,266,267,228,223,92,271,288,308,278,311,315,321,359,337,340,-12,27,12,-20,20,-22,-58,-55,-92,-109,-117,0,18,13,11,7,5,7,5,4,3,3,-28,24,53,-241,10,-338,-214,-97,-251,-175,-118,-28,42,66,-230,17,-333,-207,-92,-247,-172,-115,-1,0,-6,3,-5,1,0,-1,0,1,-1,602,602,633,648,628,631,607,592,618,618,644,644,10.53580583,10.580144595,10.18837888,10.582386364,10.321797207,9.2814965962,9.6787104756,9.8019420327,8.4663943557,8.3603576584,9.5812193958,10.156938811,10.895905191,9.8721590909,11.107539555,11.376153416,11.679947604,13.179390224,12.513924991,12.74673365,0.9545864343,0.4232057838,-0.707526311,0.7102272727,-0.785742348,-2.094656819,-2.001237128,-3.377448191,-4.047530635,-4.386375991,0.6363909562,0.4584729325,0.3891394711,0.2485795455,0.1785778064,0.2528034092,0.181930648,0.1468455735,0.1113999257,0.1124711793,0.8485212749,1.8691588785,-8.525692049,0.3551136364,-12.07185971,-7.728561368,-3.529454572,-9.214559739,-6.498329001,-4.423866384,1.4849122311,2.327631811,-8.136552578,0.6036931818,-11.8932819,-7.475757959,-3.347523924,-9.067714165,-6.386929075,-4.311395205 +050,1,2,42,133,Pennsylvania,York County,434972,435016,435420,436749,437551,439041,440616,441911,444012,445924,448417,449341,450448,404,1329,802,1490,1575,1295,2101,1912,2493,924,1107,1226,4945,4901,4854,4969,4955,4987,4919,4876,4638,4625,961,3751,3673,3866,3840,4154,4154,4296,4244,4115,4460,265,1194,1228,988,1129,801,833,623,632,523,165,99,605,548,620,743,620,842,712,914,154,282,97,-457,-910,-58,-205,-73,455,611,971,245,643,196,148,-362,562,538,547,1297,1323,1885,399,925,-57,-13,-64,-60,-92,-53,-29,-34,-24,2,17,8466,8468,8736,8740,8738,8739,8736,8740,8687,8620,8608,8609,11.339545432,11.211254718,11.074707504,11.297585309,11.229118203,11.258314775,11.054727531,10.904118228,10.332405838,10.280187911,8.6015439668,8.4021502917,8.8205231168,8.7306757066,9.4138762893,9.3777901691,9.6546268496,9.4907870712,9.1672811604,9.9134352609,2.7380014653,2.8091044264,2.2541843868,2.5669096023,1.8152419133,1.8805246054,1.4001006814,1.4133311567,1.1651246773,0.3667526498,1.3873458011,1.253574288,1.4145691496,1.6892948047,1.4050561626,1.9008423983,1.6001150645,2.0439630969,0.3430768648,0.6268136196,-1.047962035,-2.081665332,-0.132330662,-0.46609076,-0.165434032,1.0271773055,1.37313245,2.171431255,0.5458041031,1.4292239625,0.3393837662,-0.828091044,1.2822384872,1.2232040443,1.2396221305,2.9280197037,2.9732475144,4.2153943518,0.8888809679,2.0560375821 +040,1,1,44,000,Rhode Island,Rhode Island,1052567,1052970,1053994,1053829,1054893,1055560,1056511,1056886,1057816,1056554,1059338,1058158,1057125,1024,-165,1064,667,951,375,930,-1262,2784,-1180,-1033,2871,10998,11006,10873,10726,10874,10975,10577,10737,10459,10447,2330,9755,9315,9631,9697,10077,9828,10043,10039,9996,10470,541,1243,1691,1242,1029,797,1147,534,698,463,-23,1704,4585,4507,3938,3607,4654,4242,2282,4631,1295,1193,-1171,-6005,-5087,-4474,-3574,-5027,-4436,-4048,-2522,-2950,-2234,533,-1420,-580,-536,33,-373,-194,-1766,2109,-1655,-1041,-50,12,-47,-39,-111,-49,-23,-30,-23,12,31,43027,43034,41971,41831,41510,42055,41977,42039,41708,41137,41154,41167,10.435411322,10.438549984,10.303948963,10.156855522,10.29054172,10.379713075,10.004871427,10.148911192,9.8786491214,9.8776381222,9.2559954038,8.8347349722,9.1269504699,9.182456461,9.5363057674,9.2949266611,9.4997564286,9.4891421679,9.4413401489,9.8993846213,1.1794159187,1.6038150121,1.1769984927,0.9743990614,0.7542359528,1.0847864144,0.5051149988,0.6597690241,0.4373089725,-0.021746499,4.3504601667,4.2746270016,3.7319002129,3.4156048731,4.4042837195,4.0119127896,2.1585625978,4.3773500727,1.2231428064,1.1279814569,-5.697821876,-4.824723221,-4.239848033,-3.384355924,-4.757269931,-4.195390178,-3.829036545,-2.383864583,-2.786309868,-2.112246919,-1.347361709,-0.550096219,-0.50794782,0.0312489495,-0.352986211,-0.183477388,-1.670473947,1.9934854898,-1.563167061,-0.984265462 +050,1,1,44,001,Rhode Island,Bristol County,49875,49842,49817,49238,49280,49266,49100,49159,48866,48787,48696,48527,48350,-25,-579,42,-14,-166,59,-293,-79,-91,-169,-177,106,359,342,343,354,341,314,335,343,308,310,143,471,445,482,520,525,554,540,522,504,558,-37,-112,-103,-139,-166,-184,-240,-205,-179,-196,-248,17,43,105,68,77,99,36,2,30,-10,-4,1,-518,47,59,-75,152,-88,129,62,38,75,18,-475,152,127,2,251,-52,131,92,28,71,-6,8,-7,-2,-2,-8,-1,-5,-4,-1,0,3242,3242,2661,2686,2710,2749,2778,2707,2812,2770,2753,2755,7.248498309,6.9428936844,6.9612160818,7.1976089299,6.9408400248,6.4065289467,6.861028335,7.0371244217,6.3359493124,6.3998678737,9.509868255,9.0338821332,9.7822336777,10.57275888,10.686044027,11.30323897,11.059568062,10.709559616,10.367917057,11.519762173,-2.261369946,-2.090988449,-2.821017596,-3.37514995,-3.745204002,-4.896710023,-4.198539727,-3.672435194,-4.031967744,-5.119894299,0.8682045328,2.1315901663,1.380066162,1.5655816034,2.0150825879,0.7345065034,0.0409613632,0.6154919319,-0.20571264,-0.08257894,-10.458836,0.9541403601,1.1974103464,-1.524917146,3.0938641753,-1.795460342,2.642007926,1.2720166593,0.7817080321,1.5483551307,-9.590631467,3.0857305264,2.5774765084,0.0406644572,5.1089467631,-1.060953838,2.6829692892,1.8875085912,0.575995392,1.4657761904 +050,1,1,44,003,Rhode Island,Kent County,166158,166109,166029,165288,164644,164387,164526,163801,163842,163657,164230,164233,164646,-80,-741,-644,-257,139,-725,41,-185,573,3,413,406,1591,1623,1596,1527,1613,1663,1516,1541,1505,1494,423,1762,1704,1769,1728,1759,1727,1825,1738,1703,1788,-17,-171,-81,-173,-201,-146,-64,-309,-197,-198,-294,93,204,122,57,57,106,182,72,187,55,43,-139,-773,-669,-118,311,-675,-67,62,585,146,660,-46,-569,-547,-61,368,-569,115,134,772,201,703,-17,-1,-16,-23,-28,-10,-10,-10,-2,0,4,1536,1536,1277,1273,1269,1513,1209,1148,1159,1163,1146,1145,9.6040951717,9.8383909412,9.7012135635,9.2851301104,9.8255702394,10.151292718,9.258043536,9.3995797333,9.1638936501,9.0854083113,10.636339216,10.32940121,10.752786212,10.507337807,10.714927496,10.54196183,11.145072199,10.601213223,10.369508894,10.873299907,-1.032244044,-0.491010269,-1.051572648,-1.222207696,-0.889357257,-0.390669112,-1.887028663,-1.20163349,-1.205615244,-1.787891595,1.2314490352,0.7395463308,0.346471913,0.3465962124,0.6456977343,1.1109652884,0.4396959991,1.1406368657,0.3348931234,0.261494349,-4.666226001,-4.055381109,-0.717257644,1.8910775798,-4.11175444,-0.408981727,0.3786271103,3.5683024945,0.8889890186,4.0136341937,-3.434776966,-3.315834778,-0.370785731,2.2376737922,-3.466056706,0.7019835614,0.8183231094,4.7089393602,1.223882142,4.2751285427 +050,1,1,44,005,Rhode Island,Newport County,82888,83141,83186,83258,83242,83576,83457,83496,83454,83099,82796,82472,81836,45,72,-16,334,-119,39,-42,-355,-303,-324,-636,177,738,721,697,645,611,688,692,732,699,694,157,681,694,677,681,682,794,739,750,805,874,20,57,27,20,-36,-71,-106,-47,-18,-106,-180,127,213,400,275,218,337,221,77,137,19,39,-97,-195,-444,53,-292,-218,-153,-382,-418,-236,-492,30,18,-44,328,-74,119,68,-305,-281,-217,-453,-5,-3,1,-14,-9,-9,-4,-3,-4,-1,-3,3825,3831,3846,3818,3827,3717,3963,4030,3765,3929,4065,4071,8.8678474442,8.6606606607,8.3564123776,7.7230247915,7.3194252275,8.2419886193,8.309667193,8.8248590976,8.4589878258,8.4475497237,8.1829323977,8.3363363363,8.1166300999,8.154077338,8.1699640018,9.5118298892,8.8740521035,9.0418638295,9.7417527894,10.638556857,0.6849150465,0.3243243243,0.2397822777,-0.431052547,-0.850538774,-1.26984127,-0.564384911,-0.217004732,-1.282764964,-2.191007133,2.5594193843,4.8048048048,3.2970063183,2.6102626427,4.0370643235,2.6474992513,0.9246305981,1.6516471262,0.2299295689,0.4747182121,-2.343130422,-5.333333333,0.6354230359,-3.496315099,-2.61151342,-1.832884097,-4.587128422,-5.039332108,-2.855967277,-5.98875283,0.2162889621,-0.528528529,3.9324293541,-0.886052457,1.4255509035,0.8146151542,-3.662497824,-3.387684981,-2.626037708,-5.514034618 +050,1,1,44,007,Rhode Island,Providence County,626667,626796,627868,629493,631397,631836,632995,634146,635384,634525,637298,637052,636547,1072,1625,1904,439,1159,1151,1238,-859,2773,-246,-505,1943,7358,7399,7336,7289,7448,7409,7147,7247,7087,7081,1371,5765,5472,5646,5701,5852,5612,5800,5796,5731,5904,572,1593,1927,1690,1588,1596,1797,1347,1451,1356,1177,1410,3951,3745,3452,3172,3993,3664,2078,4133,1177,1067,-896,-3926,-3752,-4727,-3557,-4431,-4222,-4282,-2807,-2792,-2776,514,25,-7,-1275,-385,-438,-558,-2204,1326,-1615,-1709,-14,7,-16,24,-44,-7,-1,-2,-4,13,27,27785,27786,27723,27506,26998,27260,27084,27120,26809,26227,26362,26365,11.703878202,11.736154621,11.614642746,11.525650462,11.755597838,11.672036108,11.255924637,11.396239886,11.122533056,11.119669535,9.1699997057,8.6795834688,8.9389685038,9.014643063,9.2365411584,8.8410671666,9.1345127879,9.1144758351,8.9943892965,9.2713640636,2.5338784963,3.0565711521,2.6756742422,2.5110073994,2.5190566796,2.8309689413,2.1214118492,2.2817640505,2.1281437596,1.8483054713,6.2845912988,5.9402485546,5.4653417066,5.0156898431,6.3023767679,5.7722149142,3.2726754437,6.4993320611,1.8472162279,1.6755666422,-6.244825472,-5.951351823,-7.483971682,-5.624466826,-6.993696834,-6.651280395,-6.743790303,-4.414136244,-4.381841723,-4.359299905,0.039765827,-0.011103268,-2.018629976,-0.608776983,-0.691320066,-0.879065481,-3.471114859,2.0851958173,-2.534625495,-2.683733263 +050,1,1,44,009,Rhode Island,Washington County,126979,127082,127094,126552,126330,126495,126433,126284,126270,126486,126318,125874,125746,12,-542,-222,165,-62,-149,-14,216,-168,-444,-128,239,952,921,901,911,861,901,887,874,860,868,236,1076,1000,1057,1067,1259,1141,1139,1233,1253,1346,3,-124,-79,-156,-156,-398,-240,-252,-359,-393,-478,57,174,135,86,83,119,139,53,144,54,48,-40,-593,-269,259,39,145,94,425,56,-106,299,17,-419,-134,345,122,264,233,478,200,-52,347,-8,1,-9,-24,-28,-15,-7,-10,-9,1,3,6639,6639,6464,6548,6706,6816,6943,7034,7163,7048,6828,6831,7.5065248417,7.2840297056,7.1274597053,7.2036310729,6.8139460345,7.1351077393,7.0186266597,6.9144475562,6.8202004822,6.8992925841,8.4842654724,7.9088270419,8.3615148818,8.4371837045,9.9637143524,9.0356913769,9.0126446059,9.7545924906,9.9368734932,10.698672602,-0.977740631,-0.624797336,-1.234055177,-1.233552632,-3.149768318,-1.900583638,-1.994017946,-2.840144934,-3.116673011,-3.799380017,1.3719908849,1.0676916507,0.6803124691,0.6563132591,0.9417648991,1.1007546901,0.4193767903,1.1392224807,0.4282451466,0.3815277005,-4.675808016,-2.127474474,2.0488480174,0.3083881579,1.1475286585,0.744395258,3.3629270917,0.4430309647,-0.840629362,2.3765996344,-3.303817131,-1.059782824,2.7291604865,0.964701417,2.0892935576,1.8451499481,3.782303882,1.5822534454,-0.412384215,2.7581273349 +040,3,5,45,000,South Carolina,South Carolina,4625364,4625358,4635846,4672655,4719027,4766469,4826858,4896006,4963031,5027102,5091702,5157702,5218040,10488,36809,46372,47442,60389,69148,67025,64071,64600,66000,60338,14175,57479,57551,56587,57314,58286,57856,56797,56970,56755,56554,9656,42032,42074,44670,44535,46871,47261,48802,50406,51436,55751,4519,15447,15477,11917,12779,11415,10595,7995,6564,5319,803,1382,3404,6470,5742,6936,7986,5811,6493,6869,7353,6023,4464,17887,23940,29302,39900,49197,50446,49430,51073,53390,53671,5846,21291,30410,35044,46836,57183,56257,55923,57942,60743,59694,123,71,485,481,774,550,173,153,94,-62,-159,139195,139287,138922,138268,136588,137453,137466,137902,137223,136236,134103,130657,12.349786502,12.255738642,11.931268539,11.948722273,11.989471415,11.736643244,11.37061939,11.260224034,11.0747903,10.901196271,9.0308847794,8.9598434019,9.418590235,9.2845787494,9.6413978433,9.5873461069,9.7700400986,9.9628375053,10.036876291,10.74641216,3.3189017222,3.2958952401,2.5126783038,2.6641435239,2.3480735717,2.1492971372,1.6005792916,1.2973865291,1.0379140094,0.1547841109,0.7313744716,1.3778149643,1.2106905111,1.4460051242,1.642725847,1.1788169575,1.2998825942,1.3576703334,1.4348151366,1.1609772101,3.8431536936,5.0981283225,6.1782747049,8.3182820725,10.119857688,10.233453835,9.8957641505,10.094671267,10.418166754,10.345476979,4.5745281652,6.4759432868,7.3889652159,9.7642871967,11.762583535,11.412270793,11.195646745,11.452341601,11.85298189,11.506454189 +050,3,5,45,001,South Carolina,Abbeville County,25417,25427,25338,25093,25033,24912,24811,24814,24688,24598,24637,24584,24404,-89,-245,-60,-121,-101,3,-126,-90,39,-53,-180,65,230,281,272,243,246,235,209,241,237,232,90,290,252,278,261,317,311,311,303,301,312,-25,-60,29,-6,-18,-71,-76,-102,-62,-64,-80,2,6,19,0,-3,-5,-2,1,0,2,0,-67,-192,-106,-113,-76,80,-46,13,102,9,-99,-65,-186,-87,-113,-79,75,-48,14,102,11,-99,1,1,-2,-2,-4,-1,-2,-2,-1,0,-1,901,901,901,899,908,904,958,961,926,912,900,901,9.1213737582,11.211746399,10.891981179,9.7741487843,9.9143576826,9.4945658761,8.4811102544,9.7897836905,9.6300359603,9.4717073569,11.500862565,10.054662251,11.13224547,10.498159805,12.77581864,12.565148883,12.620216694,12.308317254,12.230552,12.737813342,-2.379488806,1.1570841479,-0.240264291,-0.724011021,-2.861460957,-3.070583007,-4.13910644,-2.518533564,-2.60051604,-3.266105985,0.2379488806,0.7580896142,0,-0.120668504,-0.201511335,-0.080804816,0.0405794749,0,0.0812661262,0,-7.614364181,-4.229342058,-4.524977475,-3.056935422,3.2241813602,-1.858510767,0.5275331737,4.1433939271,0.3656975681,-4.041806157,-7.3764153,-3.471252444,-4.524977475,-3.177603926,3.0226700252,-1.939315583,0.5681126486,4.1433939271,0.4469636944,-4.041806157 +050,3,5,45,003,South Carolina,Aiken County,160099,160128,160558,161628,162982,163789,164333,165827,167328,168510,169703,171300,172895,430,1070,1354,807,544,1494,1501,1182,1193,1597,1595,464,1926,1944,1786,1882,1926,1976,1909,1878,1852,1845,388,1545,1549,1683,1696,1685,1706,1785,1948,1890,2025,76,381,395,103,186,241,270,124,-70,-38,-180,29,52,87,130,159,243,164,199,210,214,183,316,639,880,587,235,1018,1072,869,1057,1420,1593,345,691,967,717,394,1261,1236,1068,1267,1634,1776,9,-2,-8,-13,-36,-8,-5,-10,-4,1,-1,2439,2439,2430,2403,2406,2456,2467,2335,2315,2340,2342,2341,11.955826758,11.977449863,10.931202585,11.471342976,11.667070511,11.862346355,11.368576516,11.105427645,10.862074527,10.720667064,9.5907333031,9.5437602046,10.300791686,10.337618325,10.20717228,10.241479191,10.630125239,11.519367972,11.084946467,11.766585802,2.3650934553,2.4336896584,0.6304108994,1.1337246512,1.4598982312,1.6208671639,0.7384512771,-0.413940328,-0.22287194,-1.045918738,0.3227949073,0.5360278488,0.7956642419,0.969151718,1.4720135692,0.9845267218,1.1850951947,1.2418209826,1.2551209227,1.0633507169,3.966652803,5.4218908844,3.592730077,1.4323940486,6.1667070511,6.435442962,5.175114192,6.2504989459,8.3283724777,9.2563808306,4.2894477103,5.9579187332,4.388394319,2.4015457665,7.6387206203,7.4199696838,6.3602093867,7.4923199286,9.5834934004,10.319731548 +050,3,5,45,005,South Carolina,Allendale County,10419,10419,10354,10237,9982,9828,9704,9435,9071,9010,8906,8627,8331,-65,-117,-255,-154,-124,-269,-364,-61,-104,-279,-296,20,134,104,89,97,91,81,75,86,69,64,11,124,119,105,116,121,112,118,134,120,111,9,10,-15,-16,-19,-30,-31,-43,-48,-51,-47,0,1,-2,0,1,10,2,3,4,3,3,-79,-129,-244,-138,-107,-251,-338,-21,-60,-231,-250,-79,-128,-246,-138,-106,-241,-336,-18,-56,-228,-247,5,1,6,0,1,2,3,0,0,0,-2,1342,1342,1343,1340,1343,1372,1371,1190,1139,1143,1057,946,13.015395076,10.287353479,8.9853609288,9.9324185951,9.5093787554,8.7539176483,8.2960013274,9.6003572226,7.8708720698,7.5480599127,12.044096936,11.771106385,10.600706714,11.877943887,12.644338785,12.104182427,13.052375422,14.958696138,13.688473165,13.091166411,0.97129814,-1.483752906,-1.615345785,-1.945525292,-3.134960029,-3.350264779,-4.756374094,-5.358338915,-5.817601095,-5.543106498,0.097129814,-0.197833721,0,0.102396068,1.0449866764,0.2161461148,0.3318400531,0.4465282429,0.3422118291,0.3538153084,-12.52974601,-24.13571393,-13.9323574,-10.95637928,-26.22916558,-36.5286934,-2.322880372,-6.697923644,-26.35031084,-29.48460903,-12.43261619,-24.33354765,-13.9323574,-10.85398321,-25.1841789,-36.31254728,-1.991040319,-6.251395401,-26.00809901,-29.13079373 +050,3,5,45,007,South Carolina,Anderson County,187126,186927,187095,188183,188860,190070,191872,193806,195672,198255,200209,202424,204353,168,1088,677,1210,1802,1934,1866,2583,1954,2215,1929,529,2233,2176,2282,2217,2295,2282,2359,2242,2211,2205,434,1952,1947,2023,2023,2066,2247,2251,2288,2261,2414,95,281,229,259,194,229,35,108,-46,-50,-209,36,145,155,160,182,137,32,47,44,81,59,58,666,336,811,1421,1570,1802,2427,1955,2190,2083,94,811,491,971,1603,1707,1834,2474,1999,2271,2142,-21,-4,-43,-20,5,-2,-3,1,1,-6,-4,2764,2764,2777,2784,2758,2855,2990,2907,2934,2931,2957,2956,11.900511088,11.542450065,12.044440926,11.60909248,11.901119587,11.718248528,11.976838348,11.253212335,10.982706336,10.84132092,10.40295461,10.327734502,10.677433827,10.593231433,10.713600465,11.538520789,11.428513405,11.48409894,11.231071472,11.868910976,1.4975564781,1.2147155629,1.3670070989,1.015861047,1.1875191222,0.1797277382,0.5483249435,-0.230886605,-0.248365136,-1.027590055,0.7727604602,0.8221873898,0.8444831499,0.9530242812,0.7104372041,0.1643225035,0.2386228921,0.2208480565,0.4023515211,0.290085231,3.5493687346,1.7822900836,4.2804739662,7.4409203492,8.1415066454,9.2534109757,12.322079979,9.8126806939,10.878392978,10.241483663,4.3221291949,2.6044774734,5.1249571161,8.3939446303,8.8519438495,9.4177334792,12.560702871,10.03352875,11.280744499,10.531568894 +050,3,5,45,009,South Carolina,Bamberg County,15987,15962,15945,15809,15683,15389,15148,14676,14478,14402,14288,14108,13906,-17,-136,-126,-294,-241,-472,-198,-76,-114,-180,-202,37,172,164,154,151,135,116,134,135,134,140,18,211,179,197,154,182,192,194,194,207,205,19,-39,-15,-43,-3,-47,-76,-60,-59,-73,-65,0,-5,-9,3,1,1,13,11,14,13,11,-37,-92,-100,-260,-246,-432,-137,-26,-69,-119,-146,-37,-97,-109,-257,-245,-431,-124,-15,-55,-106,-135,1,0,-2,6,7,6,2,-1,0,-1,-2,1241,1239,1202,1165,1203,1159,989,957,1019,1008,999,999,10.833280847,10.415343579,9.91246138,9.8896420736,9.053111588,7.9577416478,9.2797783934,9.41094458,9.4379490069,9.9950024988,13.289664294,11.367966468,12.680226571,10.086125029,12.204935622,13.171434452,13.434903047,13.523875915,14.579518242,14.635539373,-2.456383448,-0.952622888,-2.767765191,-0.196482955,-3.151824034,-5.213692804,-4.155124654,-4.112931335,-5.141569235,-4.640536874,-0.314920955,-0.571573733,0.193099897,0.0654943184,0.0670600858,0.8918158743,0.7617728532,0.9759498083,0.9156219186,0.7853216249,-5.794545569,-6.350819256,-16.73532441,-16.11160232,-28.96995708,-9.398367291,-1.800554017,-4.810038341,-8.381462178,-10.42335975,-6.109466524,-6.922392989,-16.54222451,-16.046108,-28.902897,-8.506551417,-1.038781163,-3.834088533,-7.465840259,-9.638038124 +050,3,5,45,011,South Carolina,Barnwell County,22621,22621,22639,22463,22362,22217,22032,21791,21610,21362,21150,20924,20805,18,-176,-101,-145,-185,-241,-181,-248,-212,-226,-119,68,293,322,301,314,249,243,245,238,252,247,36,236,252,280,265,256,268,271,254,285,304,32,57,70,21,49,-7,-25,-26,-16,-33,-57,1,0,-2,-1,5,5,-3,-3,-4,-5,-4,-13,-235,-170,-169,-241,-240,-152,-220,-192,-188,-58,-12,-235,-172,-170,-236,-235,-155,-223,-196,-193,-62,-2,2,1,4,2,1,-1,1,0,0,0,285,285,285,284,284,284,284,285,285,285,285,285,12.992771939,14.366982711,13.504116288,14.192411128,11.363895671,11.197898666,11.402773899,11.19683854,11.978894329,11.838289918,10.465167842,11.2437256,12.56196864,11.977671812,11.683362618,12.349945854,12.612864191,11.949567181,13.547559063,14.570202976,2.5276040974,3.123257111,0.942147648,2.2147393161,-0.319466947,-1.152047188,-1.210090291,-0.752728641,-1.568664734,-2.731913058,0,-0.089235917,-0.044864174,0.2259938078,0.2281906761,-0.138245663,-0.139625803,-0.18818216,-0.237676475,-0.191713197,-10.42082391,-7.585052984,-7.582045358,-10.89290153,-10.95315245,-7.004446902,-10.23922554,-9.032743696,-8.936635452,-2.779841357,-10.42082391,-7.674288901,-7.626909531,-10.66690773,-10.72496178,-7.142692565,-10.37885135,-9.220925856,-9.174311927,-2.971554554 +050,3,5,45,013,South Carolina,Beaufort County,162233,162219,162843,163864,167423,171095,175318,180070,183808,186993,189563,192638,195656,624,1021,3559,3672,4223,4752,3738,3185,2570,3075,3018,512,2076,2040,2031,2046,2081,2055,1927,1997,1865,1875,359,1306,1262,1378,1506,1495,1552,1602,1617,1702,1894,153,770,778,653,540,586,503,325,380,163,-19,163,146,898,469,424,575,387,300,215,356,279,298,112,1824,2494,3165,3541,2835,2549,1976,2564,2773,461,258,2722,2963,3589,4116,3222,2849,2191,2920,3052,10,-7,59,56,94,50,13,11,-1,-8,-15,5265,5259,5086,5151,5219,5358,5485,5714,5475,5745,5536,5537,12.708634954,12.315605502,11.999361925,11.812489716,11.711143877,11.294994476,10.393715227,10.606656115,9.7592627963,9.6576305583,7.9949312381,7.6187716391,8.1413691443,8.6948238086,8.4133397864,8.5303315947,8.640753396,8.5883640149,8.9063084607,9.7554945479,4.7137037162,4.6968338631,3.8579927803,3.1176659075,3.2978040902,2.7646628815,1.7529618313,2.0182921,0.8529543355,-0.09786399,0.8937671981,5.4212812456,2.7709013996,2.4479450829,3.2358999178,2.127086551,1.6181186135,1.141928425,1.8628941316,1.4370554271,0.6856296314,11.011600214,14.734814692,18.272986291,19.927515842,15.582145664,13.748614486,10.49511892,13.417024027,14.282991754,1.5793968296,16.432881459,17.505716092,20.720931374,23.16341576,17.709232215,15.366733099,11.637047345,15.279918158,15.720047181 +050,3,5,45,015,South Carolina,Berkeley County,177843,178375,179492,183833,189696,194171,198485,203313,208798,214938,221841,228952,235987,1117,4341,5863,4475,4314,4828,5485,6140,6903,7111,7035,609,2489,2588,2635,2559,2774,2716,2713,2740,2856,2873,223,1136,1176,1255,1285,1438,1410,1508,1539,1653,1833,386,1353,1412,1380,1274,1336,1306,1205,1201,1203,1040,98,117,707,467,463,616,410,366,304,414,346,594,2852,3628,2582,2533,2846,3750,4541,5374,5504,5675,692,2969,4335,3049,2996,3462,4160,4907,5678,5918,6021,39,19,116,46,44,30,19,28,24,-10,-26,3742,3731,3742,3739,3731,3741,3744,3799,3792,3845,3838,3684,13.70123168,13.857023149,13.72871333,13.03430993,13.80793334,13.180914851,12.805142825,12.546390738,12.671004208,12.358610484,6.2533544347,6.2966998546,6.5387230473,6.5451693085,7.157825574,6.8428166198,7.1176392848,7.0470420968,7.3337429818,7.8849053317,7.4478772449,7.5603232948,7.1899902831,6.4891406218,6.6501077656,6.3380982308,5.6875035399,5.4993486408,5.3372612263,4.4737051527,0.6440514691,3.785515984,2.4331343929,2.3582983579,3.066217353,1.9897551873,1.7274907018,1.3920083154,1.836763215,1.4883672912,15.699442648,19.425533225,13.452576022,12.901878489,14.166322381,18.198980372,21.433156494,24.607410155,24.419190183,24.411804559,16.343494117,23.211049209,15.885710415,15.260176847,17.232539734,20.188735559,23.160647195,25.99941847,26.255953398,25.900171851 +050,3,5,45,017,South Carolina,Calhoun County,15175,15179,15098,15098,14872,14990,14844,14758,14754,14689,14530,14513,14554,-81,0,-226,118,-146,-86,-4,-65,-159,-17,41,41,146,166,126,149,128,150,117,143,125,124,73,158,156,166,171,182,156,173,193,175,194,-32,-12,10,-40,-22,-54,-6,-56,-50,-50,-70,0,-1,-1,7,10,6,0,0,0,0,1,-50,14,-243,151,-135,-36,3,-7,-109,33,110,-50,13,-244,158,-125,-30,3,-7,-109,33,111,1,-1,8,0,1,-2,-1,-2,0,0,0,153,153,153,155,158,156,158,159,158,158,158,158,9.6701549874,11.077744411,8.4388185654,9.9886036066,8.64806432,10.165356465,7.9475596916,9.7881515452,8.6079261784,8.5320122476,10.464962247,10.41041041,11.117808586,11.463430985,12.296466455,10.571970724,11.751519886,13.210582155,12.05109665,13.348470774,-0.794807259,0.6673340007,-2.678990021,-1.474827378,-3.648402135,-0.406614259,-3.803960194,-3.42243061,-3.443170471,-4.816458527,-0.066233938,-0.0667334,0.4688232536,0.670376081,0.405378015,0,0,0,0,0.0688065504,0.9272751358,-16.21621622,10.113187328,-9.050077093,-2.43226809,0.2033071293,-0.475495024,-7.46089873,2.2724925111,7.5687205422,0.8610411975,-16.28294962,10.582010582,-8.379701012,-2.026890075,0.2033071293,-0.475495024,-7.46089873,2.2724925111,7.6375270926 +050,3,5,45,019,South Carolina,Charleston County,350209,350162,350998,357461,364913,372065,380239,389885,397433,402725,406959,412615,417981,836,6463,7452,7152,8174,9646,7548,5292,4234,5656,5366,1108,4787,4759,4624,4922,5079,4929,4932,4772,4941,4886,754,2885,2810,2868,2960,3128,3106,3296,3392,3410,3890,354,1902,1949,1756,1962,1951,1823,1636,1380,1531,996,102,143,429,382,531,648,488,521,544,589,478,364,4383,4864,4861,5477,6922,5198,3113,2297,3527,3900,466,4526,5293,5243,6008,7570,5686,3634,2841,4116,4378,16,35,210,153,204,125,39,22,13,9,-8,10365,10364,10354,10554,10548,10538,10627,10874,11017,11056,11056,11055,13.51383778,13.176000244,12.548542833,13.085135796,13.190083675,12.520988978,12.327565306,11.787314557,12.057483522,11.765045823,8.1444374339,7.7799034849,7.7831359959,7.869159276,8.1233671461,7.8900774528,8.2383729213,8.3785773215,8.3213962376,9.3667679594,5.3694003464,5.3960967587,4.7654068371,5.2159765201,5.0667165288,4.6309115249,4.0891923845,3.4087372358,3.7360872844,2.3982778631,0.403693086,1.1877503897,1.036665952,1.4116633701,1.6828458794,1.2396515766,1.302242807,1.3437340987,1.4373320774,1.1509807415,12.373334237,13.466708381,13.191709929,14.56060316,17.97632589,13.204321507,7.7809632598,5.6738184279,8.6069104193,9.3908470544,12.777027323,14.654458771,14.228375881,15.972266531,19.65917177,14.443973083,9.0832060668,7.0175525267,10.044242497,10.541827796 +050,3,5,45,021,South Carolina,Cherokee County,55342,55484,55534,55706,55829,56065,56361,56534,56730,56974,57198,57331,57316,50,172,123,236,296,173,196,244,224,133,-15,188,690,700,669,663,676,672,652,695,641,639,166,580,554,616,608,633,642,626,672,742,723,22,110,146,53,55,43,30,26,23,-101,-84,-2,-12,-15,-8,-11,3,8,11,4,11,14,37,75,7,193,259,132,161,211,198,222,52,35,63,-8,185,248,135,169,222,202,233,66,-7,-1,-15,-2,-7,-5,-3,-4,-1,1,3,832,832,921,993,1092,1140,1199,1235,1134,1136,1137,1138,12.405609493,12.552113686,11.957745724,11.794424777,11.97572966,11.86608278,11.468374024,12.174613741,11.193671472,11.147260722,10.427903632,9.9341014031,11.010420577,10.816003416,11.213959874,11.336346942,11.011046225,11.771712854,12.957416899,12.612628329,1.9777058612,2.6180122831,0.947325147,0.9784213616,0.7617697861,0.5297358384,0.4573277985,0.4029008864,-1.763745427,-1.465367607,-0.21574973,-0.268973865,-0.142992475,-0.195684272,0.0531467293,0.1412628902,0.1934848378,0.0700697194,0.1920910861,0.2442279344,1.3484358145,0.1255211369,3.4496934599,4.6074751392,2.3384560875,2.8429156661,3.7113909801,3.4684511089,3.876747374,0.9071323279,1.1326860841,-0.143452728,3.3067009849,4.4117908669,2.3916028168,2.9841785563,3.9048758179,3.5385208282,4.0688384601,1.1513602624 +050,3,5,45,023,South Carolina,Chester County,33140,33159,33163,32884,32708,32744,32449,32420,32299,32300,32281,32186,32232,4,-279,-176,36,-295,-29,-121,1,-19,-95,46,96,380,456,412,370,380,363,362,361,375,374,50,384,356,368,425,410,425,429,431,462,486,46,-4,100,44,-55,-30,-62,-67,-70,-87,-112,-1,-6,-4,-2,-2,3,-2,-1,0,0,-1,-39,-269,-279,0,-239,3,-55,71,53,-9,159,-40,-275,-283,-2,-241,6,-57,70,53,-9,158,-2,0,7,-6,1,-5,-2,-2,-2,1,0,218,218,218,218,218,218,218,218,218,218,218,218,11.506957167,13.904134651,12.589378476,11.350911908,11.715919777,11.217725861,11.207603833,11.179758753,11.633859184,11.611661337,11.628083032,10.854982315,11.244881745,13.038209624,12.640860812,13.133701077,13.281939349,13.347579009,14.332914514,15.088950293,-0.121125865,3.0491523357,1.3444967304,-1.687297716,-0.924941035,-1.915975216,-2.074335516,-2.167820257,-2.699055331,-3.477288957,-0.181688797,-0.121966093,-0.061113488,-0.061356281,0.0924941035,-0.061805652,-0.030960232,0,0,-0.031047223,-8.145714415,-8.507135016,0,-7.33207553,0.0924941035,-1.699655433,2.1981764424,1.641349623,-0.27921262,4.9365084293,-8.327403213,-8.62910111,-0.061113488,-7.39343181,0.184988207,-1.761461086,2.1672162108,1.641349623,-0.27921262,4.9054612065 +050,3,5,45,025,South Carolina,Chesterfield County,46734,46717,46612,46498,46078,46133,46162,46161,46134,45987,45807,45631,45606,-105,-114,-420,55,29,-1,-27,-147,-180,-176,-25,115,519,505,515,529,542,502,495,475,506,475,138,479,473,491,493,531,533,536,553,535,603,-23,40,32,24,36,11,-31,-41,-78,-29,-128,2,12,20,42,36,22,7,20,19,13,16,-86,-164,-476,-5,-35,-31,0,-125,-119,-162,87,-84,-152,-456,37,1,-9,7,-105,-100,-149,103,2,-2,4,-6,-8,-3,-3,-1,-2,2,0,874,874,874,872,872,874,874,873,874,872,872,872,11.148104393,10.909955064,11.170033944,11.463242863,11.74138622,10.878162414,10.746735272,10.3492603,11.067608653,10.412442321,10.288905596,10.218631179,10.649488673,10.683135598,11.503092404,11.549921448,11.636868901,12.048717781,11.70191824,13.218321514,0.8591987971,0.6913238852,0.5205452712,0.7801072647,0.2382938163,-0.671759034,-0.890133629,-1.699457481,-0.634309587,-2.805879194,0.2577596391,0.4320774283,0.9109542246,0.7801072647,0.4765876326,0.1516875237,0.4342115261,0.413970412,0.2843456769,0.3507348992,-3.522715068,-10.28344279,-0.108446931,-0.758437619,-0.6715553,0,-2.713822038,-2.592762054,-3.543384588,1.9071210145,-3.264955429,-9.851365365,0.8025072931,0.0216696462,-0.194967668,0.1516875237,-2.279610512,-2.178791642,-3.259038912,2.2578559137 +050,3,5,45,027,South Carolina,Clarendon County,34971,34949,34947,34711,34329,34267,34222,34037,34283,34053,33772,33803,33415,-2,-236,-382,-62,-45,-185,246,-230,-281,31,-388,79,365,341,352,370,343,318,304,319,321,302,64,386,360,372,405,384,393,419,407,436,441,15,-21,-19,-20,-35,-41,-75,-115,-88,-115,-139,2,-7,-7,1,3,6,15,14,15,18,15,-14,-209,-364,-37,-5,-150,306,-127,-207,129,-262,-12,-216,-371,-36,-2,-144,321,-113,-192,147,-247,-5,1,8,-6,-8,0,0,-2,-1,-1,-2,1661,1661,1686,1562,1479,1584,1506,1649,1654,1528,1557,1287,10.479772603,9.8783314021,10.262989096,10.804654762,10.049956782,9.3091334895,8.8972137673,9.4065610026,9.500554939,8.9856883573,11.082718424,10.428736964,10.846113476,11.826716699,11.25126357,11.504683841,12.262936081,12.001474383,12.90418054,13.121485316,-0.602945821,-0.550405562,-0.58312438,-1.022061937,-1.201306787,-2.195550351,-3.365722313,-2.59491338,-3.403625601,-4.135796959,-0.20098194,-0.202780997,0.029156219,0.0876053089,0.1758009933,0.4391100703,0.4097401077,0.4423147807,0.5327413984,0.4463090244,-6.000746504,-10.54461182,-1.078780104,-0.146008848,-4.395024832,8.9578454333,-3.71692812,-6.103943973,3.8179800222,-7.795530959,-6.201728445,-10.74739282,-1.049623885,-0.058403539,-4.219223839,9.3969555035,-3.307188012,-5.661629193,4.3507214206,-7.349221935 +050,3,5,45,029,South Carolina,Colleton County,38892,38885,38886,38447,38106,37666,37529,37444,37603,37599,37731,37705,37481,1,-439,-341,-440,-137,-85,159,-4,132,-26,-224,112,470,442,449,438,458,477,444,487,438,451,96,465,448,501,522,527,496,586,543,561,614,16,5,-6,-52,-84,-69,-19,-142,-56,-123,-163,-1,-10,-10,-6,-16,-11,-10,11,-7,17,16,-10,-434,-330,-385,-32,0,188,128,196,83,-79,-11,-444,-340,-391,-48,-11,178,139,189,100,-63,-4,0,5,3,-5,-5,0,-1,-1,-3,2,388,388,388,388,389,387,389,389,385,386,385,385,12.155224807,11.547555288,11.851343504,11.649710752,12.217731717,12.712033792,11.808196591,12.929775654,11.612492709,11.996914319,12.025913905,11.704309433,13.223882173,13.883901855,14.058394355,13.218383147,15.584691896,14.416567105,14.873535182,16.33282792,0.1293109022,-0.156754144,-1.372538669,-2.234191103,-1.840662639,-0.506349354,-3.776495306,-1.486791451,-3.261042473,-4.335913601,-0.258621804,-0.261256907,-0.158369846,-0.42556021,-0.293438971,-0.26649966,0.292545411,-0.185848931,0.4507131873,0.425611151,-11.22418631,-8.62147793,-10.16206514,-0.85112042,0,5.010193612,3.4041647829,5.2037700783,2.2005408558,-2.101455058,-11.48280812,-8.882734837,-10.32043499,-1.27668063,-0.293438971,4.7436939518,3.6967101939,5.017921147,2.6512540432,-1.675843907 +050,3,5,45,031,South Carolina,Darlington County,68681,68600,68513,68162,68053,67809,67660,67539,67310,67022,66793,66656,66509,-87,-351,-109,-244,-149,-121,-229,-288,-229,-137,-147,183,799,793,802,739,839,831,742,760,767,757,213,803,762,848,790,840,833,903,877,892,936,-30,-4,31,-46,-51,-1,-2,-161,-117,-125,-179,7,48,5,12,27,28,31,34,33,37,35,-60,-395,-139,-199,-113,-142,-255,-157,-142,-50,-6,-53,-347,-134,-187,-86,-114,-224,-123,-109,-13,29,-4,0,-6,-11,-12,-6,-3,-4,-3,1,3,1345,1345,1345,1355,1360,1367,1378,1390,1396,1412,1440,1441,11.691970002,11.643357927,11.806097364,10.910245148,12.411334403,12.324896736,11.047256052,11.358965736,11.495028063,11.369353809,11.750503018,11.188195133,12.483255068,11.663184935,12.426127412,12.354559544,13.444302177,13.107648619,13.36840291,14.057747907,-0.058533016,0.4551627941,-0.677157704,-0.752939787,-0.014793009,-0.029662808,-2.397046125,-1.748682883,-1.873374847,-2.688394098,0.7023961954,0.0734133539,0.1766498359,0.3986151813,0.4142042471,0.4597735245,0.5062084983,0.4932182491,0.5545189548,0.5256636504,-5.780135358,-2.040891238,-2.929443111,-1.668278352,-2.100607253,-3.782008024,-2.337492184,-2.122333072,-0.749349939,-0.090113769,-5.077739162,-1.967477884,-2.752793276,-1.26966317,-1.686403006,-3.322234499,-1.831283685,-1.629114823,-0.194830984,0.4355498817 +050,3,5,45,033,South Carolina,Dillon County,32062,32059,32080,31752,31529,31407,31290,31138,30695,30442,30509,30352,30367,21,-328,-223,-122,-117,-152,-443,-253,67,-157,15,121,444,427,456,425,406,402,391,412,436,404,135,330,360,378,334,405,400,403,341,380,418,-14,114,67,78,91,1,2,-12,71,56,-14,1,23,72,54,57,29,3,8,10,10,8,37,-468,-370,-257,-266,-181,-449,-247,-13,-223,20,38,-445,-298,-203,-209,-152,-446,-239,-3,-213,28,-3,3,8,3,1,-1,1,-2,-1,0,1,451,451,451,449,484,484,468,483,478,469,468,468,13.911517734,13.495361957,14.490911402,13.557267493,13.006984046,13.002765514,12.790944927,13.519056291,14.327730402,13.307202029,10.339641559,11.377822727,12.012202873,10.654417277,12.974947139,12.938075138,13.183505897,11.189316008,12.487471451,13.768342693,3.571876175,2.1175392298,2.4787085293,2.9028502161,0.0320369065,0.0646903757,-0.39256097,2.3297402832,1.8402589507,-0.461140664,0.7206416844,2.2755645454,1.7160289818,1.8182688167,0.929070289,0.0970355635,0.2617073131,0.3281324343,0.3286176698,0.2635089511,-14.66349167,-11.69387336,-8.167026821,-8.485254478,-5.798680079,-14.52298934,-8.080213291,-0.426572165,-7.328174036,0.6587723777,-13.94284998,-9.418308813,-6.450997839,-6.666985661,-4.86960979,-14.42595378,-7.818505978,-0.09843973,-6.999556366,0.9222813287 +050,3,5,45,035,South Carolina,Dorchester County,136555,136110,137005,140155,142645,145614,148854,152946,156418,159533,161340,163517,165737,895,3150,2490,2969,3240,4092,3472,3115,1807,2177,2220,431,1758,1844,1803,1830,1933,1812,1882,1750,1876,1835,170,864,907,942,948,1047,1137,1210,1221,1268,1359,261,894,937,861,882,886,675,672,529,608,476,59,98,305,189,200,188,210,209,231,212,183,540,2145,1229,1889,2115,2986,2582,2232,1052,1357,1562,599,2243,1534,2078,2315,3174,2792,2441,1283,1569,1745,35,13,19,30,43,32,5,2,-5,0,-1,2015,2015,2015,2008,2012,1984,1870,1825,1972,1962,1874,2000,12.685813249,13.041018388,12.509583395,12.429194344,12.80980782,11.714355904,11.913239711,10.907742315,11.549697251,11.146409763,6.234665897,6.414427157,6.5357889953,6.4387301846,6.9383697813,7.3505643837,7.6594155423,7.6104876384,7.8065117883,8.2550249959,6.4511473517,6.6265912306,5.9737944002,5.9904641591,5.8714380384,4.3637915207,4.2538241689,3.2972546771,3.7431854631,2.8913847668,0.7071727522,2.1570014144,1.311320722,1.3583818955,1.2458581842,1.3576240287,1.3229899573,1.4398219856,1.3051896681,1.1116038074,15.478424015,8.6916548798,13.106269015,14.364888545,19.787939032,16.692310676,14.128773133,6.5571113805,8.3544451867,9.4881155582,16.185596767,10.848656294,14.417589737,15.72327044,21.033797217,18.049934705,15.45176309,7.9969333662,9.6596348547,10.599719366 +050,3,5,45,037,South Carolina,Edgefield County,26985,26966,26965,26894,26563,26573,26655,26789,26637,26846,27151,27349,27120,-1,-71,-331,10,82,134,-152,209,305,198,-229,47,153,185,212,235,204,206,194,180,195,191,18,182,196,196,229,237,227,223,251,228,298,29,-29,-11,16,6,-33,-21,-29,-71,-33,-107,-2,-5,-8,-3,15,18,8,12,5,13,16,-24,-37,-317,1,67,151,-138,228,370,218,-136,-26,-42,-325,-2,82,169,-130,240,375,231,-120,-4,0,5,-4,-6,-2,-1,-2,1,0,-2,3045,3046,3045,3044,3045,3049,2974,2831,2754,2848,2787,2447,5.6815016989,6.9214508858,7.9795242397,8.8299391298,7.6341591198,7.7116010931,7.2546416618,6.6670370576,7.1559633028,7.0131634508,6.7583876418,7.3329966141,7.3772959952,8.6044938754,8.8690966245,8.4977351851,8.3390984051,9.2968127859,8.3669724771,10.942003709,-1.076885943,-0.411545728,0.6022282445,0.2254452544,-1.234937505,-0.786134092,-1.084456743,-2.629775728,-1.211009174,-3.928840258,-0.18566999,-0.299305984,-0.112917796,0.5636131359,0.6736022753,0.2994796541,0.4487407214,0.1851954738,0.4770642202,0.587490132,-1.373957927,-11.85999963,0.0376392653,2.5174720072,5.6507746426,-5.166024033,8.5260737057,13.704465063,8,-4.993666122,-1.559627917,-12.15930561,-0.075278531,3.0810851432,6.3243769179,-4.866544379,8.974814427,13.889660537,8.4770642202,-4.40617599 +050,3,5,45,039,South Carolina,Fairfield County,23956,23977,23860,23591,23425,23216,23050,22899,22651,22608,22392,22322,22059,-117,-269,-166,-209,-166,-151,-248,-43,-216,-70,-263,60,232,242,231,213,216,201,203,224,190,193,100,273,264,286,290,303,304,298,292,303,326,-40,-41,-22,-55,-77,-87,-103,-95,-68,-113,-133,0,16,25,22,17,22,14,9,10,10,7,-80,-245,-169,-175,-103,-83,-159,45,-157,34,-137,-80,-229,-144,-153,-86,-61,-145,54,-147,44,-130,3,1,0,-1,-3,-3,0,-2,-1,-1,0,397,397,397,399,398,399,397,397,397,397,397,397,9.778508356,10.294367875,9.9054479964,9.2076254701,9.4017280028,8.8254665203,8.9705914846,9.9555555556,8.4984568591,8.6974155607,11.506606815,11.2302195,12.263887996,12.536203692,13.188535115,13.347969265,13.168651539,12.977777778,13.552802254,14.690971362,-1.728098459,-0.935851625,-2.358439999,-3.328578222,-3.786807112,-4.522502744,-4.198060054,-3.022222222,-5.054345395,-5.993555801,0.6743798866,1.0634677557,0.9433759997,0.7348809061,0.9575834077,0.6147091109,0.3977109525,0.4444444444,0.4472872031,0.3154503053,-10.32644201,-7.189042028,-7.50412727,-4.452513725,-3.612701038,-6.981339188,1.9885547626,-6.977777778,1.5207764906,-6.173813118,-9.652062127,-6.125574273,-6.56075127,-3.717632819,-2.65511763,-6.366630077,2.3862657151,-6.533333333,1.9680636937,-5.858362813 +050,3,5,45,041,South Carolina,Florence County,136885,136981,137161,137670,138031,138230,138837,138781,138665,138510,138294,138128,137588,180,509,361,199,607,-56,-116,-155,-216,-166,-540,427,1817,1837,1776,1765,1735,1693,1603,1716,1594,1584,271,1471,1440,1577,1412,1444,1455,1574,1545,1678,1759,156,346,397,199,353,291,238,29,171,-84,-175,11,34,47,37,65,82,77,64,71,68,57,30,135,-55,-10,218,-418,-426,-244,-458,-153,-427,41,169,-8,27,283,-336,-349,-180,-387,-85,-370,-17,-6,-28,-27,-29,-11,-5,-4,0,3,5,3228,3230,3234,3246,3233,3232,3209,3258,3056,3081,2984,2939,13.222671387,13.326030736,12.857406583,12.740600649,12.499189534,12.204176669,11.566699738,12.398664759,11.533090709,11.490083999,10.70476038,10.446099216,11.416739967,10.192480519,10.402783681,10.488527497,11.357445657,11.163133481,12.140857095,12.759506159,2.5179110071,2.87993152,1.440666616,2.5481201298,2.0964058526,1.7156491714,0.2092540814,1.2355312784,-0.607766386,-1.269422159,0.247424781,0.3409490716,0.2678626371,0.4692005905,0.5907397935,0.5550629672,0.4618021106,0.5129983671,0.4920013602,0.4134689318,0.9824219247,-0.398982956,-0.072395307,1.5736265957,-3.011332118,-3.070867845,-1.760620547,-3.309200734,-1.107003061,-3.097390068,1.2298467058,-0.058033885,0.1954673298,2.0428271862,-2.420592325,-2.515804877,-1.298818436,-2.796202367,-0.6150017,-2.683921136 +050,3,5,45,043,South Carolina,Georgetown County,60158,60324,60343,60192,60253,60503,60866,61506,61609,61894,62462,63025,63353,19,-151,61,250,363,640,103,285,568,563,328,135,586,590,602,593,569,555,546,555,515,520,119,671,707,744,682,710,787,790,775,868,939,16,-85,-117,-142,-89,-141,-232,-244,-220,-353,-419,6,19,30,21,8,17,-2,16,20,7,13,5,-81,160,375,440,760,340,514,768,911,738,11,-62,190,396,448,777,338,530,788,918,751,-8,-4,-12,-4,4,4,-3,-1,0,-2,-4,559,559,559,550,552,553,554,554,560,553,553,553,9.7233168789,9.7970027814,9.9705190632,9.7718527795,9.2995129605,9.0159606872,8.8418904804,8.9259866834,8.208021548,8.2292804127,11.133695607,11.739798248,12.322369075,11.23845463,11.603961691,12.784794704,12.793211501,12.464215639,13.834102337,14.860181361,-1.410378728,-1.942795467,-2.351850012,-1.466601851,-2.30444873,-3.768834017,-3.951321021,-3.538228956,-5.626080789,-6.630900948,0.3152611275,0.4981526838,0.3478088045,0.1318293798,0.2778413363,-0.032489948,0.2591030177,0.3216571778,0.1115653414,0.2057320103,-1.344007964,2.6568143136,6.2108715095,7.2506158904,12.421142091,5.5232912318,8.3236844449,12.351635627,14.519432292,11.67924797,-1.028746837,3.1549669974,6.558680314,7.3824452702,12.698983428,5.4908012834,8.5827874627,12.673292805,14.630997633,11.884979981 +050,3,5,45,045,South Carolina,Greenville County,451225,451183,452688,458972,466172,473196,481737,491218,499595,507484,515572,524748,532486,1505,6284,7200,7024,8541,9481,8377,7889,8088,9176,7738,1536,6103,6105,6035,6202,6415,6355,6325,6307,6269,6276,814,3741,3745,3954,3966,4164,4261,4427,4479,4572,4894,722,2362,2360,2081,2236,2251,2094,1898,1828,1697,1382,181,743,795,883,1182,1415,1392,1639,1866,1860,1499,598,3171,3990,4012,5029,5768,4879,4346,4388,5618,4849,779,3914,4785,4895,6211,7183,6271,5985,6254,7478,6348,4,8,55,48,94,47,12,6,6,1,8,11854,11854,11718,11441,11418,11333,11145,10986,10848,10749,10607,10465,13.388763355,13.197945401,12.849064477,12.989392973,13.186632475,12.827849453,12.561080114,12.329725841,12.052060904,11.872489912,8.2070069982,8.0960369413,8.4184260056,8.3063419109,8.5594914462,8.6010175482,8.791763109,8.7561189221,8.789603199,9.2581207188,5.1817563565,5.1019084597,4.4306384718,4.6830510622,4.6271410291,4.2268319047,3.7693170049,3.5736069189,3.2624577053,2.6143691936,1.629993638,1.7186513667,1.8799873958,2.4755663486,2.9086648406,2.809813759,3.2549581512,3.6478941524,3.5758228237,2.8357014625,6.9565408157,8.6256842178,8.5419132864,10.532676114,11.856663463,9.8484779671,8.6309018458,8.5782205471,10.800522916,9.172992923,8.5865344536,10.344335585,10.421900682,13.008242463,14.765328304,12.658291726,11.885859997,12.226114699,14.37634574,12.008694386 +050,3,5,45,047,South Carolina,Greenwood County,69661,69683,69759,69846,69966,69835,69686,69992,70175,70515,70633,70963,71074,76,87,120,-131,-149,306,183,340,118,330,111,237,924,890,893,876,879,765,852,795,833,801,137,678,658,718,721,757,751,759,877,846,883,100,246,232,175,155,122,14,93,-82,-13,-82,9,33,81,73,144,136,67,83,80,113,88,-27,-190,-181,-376,-454,58,106,167,123,231,101,-18,-157,-100,-303,-310,194,173,250,203,344,189,-6,-2,-12,-3,6,-10,-4,-3,-3,-1,4,2640,2640,2641,2632,2550,2469,2394,2472,2653,2638,2623,2524,13.237348233,12.731382142,12.775302036,12.557249446,12.586090866,10.915550736,12.11173502,11.264771729,11.765869092,11.278751311,9.7131191576,9.4126398306,10.271743407,10.335361702,10.839215911,10.715789023,10.789679437,12.426672712,11.949490099,12.433380035,3.5242290749,3.3187423111,2.5035586298,2.2218877445,1.7468749553,0.1997617128,1.3220555832,-1.161900983,-0.183621006,-1.154628724,0.4727624369,1.1586988241,1.0443415998,2.0642053884,1.9473360157,0.9560024828,1.1798990689,1.133561935,1.596090285,1.2391137521,-2.721965546,-2.5891912,-5.379074542,-6.507980877,0.8304815361,1.5124815399,2.3740137892,1.742851475,3.262804034,1.4221646472,-2.249203109,-1.430492375,-4.334732942,-4.443775489,2.7778175518,2.4684840226,3.5539128581,2.87641341,4.858894319,2.6612783993 +050,3,5,45,049,South Carolina,Hampton County,21090,21092,21074,20798,20738,20387,20433,19969,19804,19527,19416,19316,18053,-18,-276,-60,-351,46,-464,-165,-277,-111,-100,-1263,64,240,222,214,220,218,207,204,207,194,188,28,205,198,253,190,226,234,241,246,253,272,36,35,24,-39,30,-8,-27,-37,-39,-59,-84,1,6,-2,0,5,4,12,15,14,14,12,-57,-318,-80,-320,16,-466,-150,-256,-86,-55,-1183,-56,-312,-82,-320,21,-462,-138,-241,-72,-41,-1171,2,1,-2,8,-5,6,0,1,0,0,-8,1531,1531,1531,1531,1531,1581,1419,1412,1405,1397,1372,281,11.463507833,10.689522342,10.407294833,10.779029887,10.791544973,10.409071481,10.373496733,10.630922117,10.017556542,10.061815944,9.7917462744,9.5338983051,12.303951368,9.3091621754,11.187564972,11.766776456,12.254964278,12.633849472,13.064133017,14.55752094,1.671761559,1.155624037,-1.896656535,1.4698677119,-0.396019999,-1.357704976,-1.881467545,-2.002927355,-3.046576474,-4.495704996,0.2865876958,-0.096302003,0,0.244977952,0.1980099995,0.6034244337,0.7627571127,0.7189995635,0.7229164515,0.6422435709,-15.18914788,-3.852080123,-15.56231003,0.7839294463,-23.06816494,-7.542805421,-13.01772139,-4.416711604,-2.840028917,-63.31451203,-14.90256018,-3.948382126,-15.56231003,1.0289073983,-22.87015494,-6.939380987,-12.25496428,-3.697712041,-2.117112465,-62.67226846 +050,3,5,45,051,South Carolina,Horry County,269291,269136,270295,275545,281441,289005,298042,309350,321542,333246,344680,354418,365449,1159,5250,5896,7564,9037,11308,12192,11704,11434,9738,11031,703,3102,3081,2993,3191,3092,3192,3118,3204,3091,3135,585,2697,2760,2926,3008,3204,3414,3558,3741,3950,4357,118,405,321,67,183,-112,-222,-440,-537,-859,-1222,70,203,245,362,420,420,285,361,386,474,359,914,4615,5159,6964,8164,10818,12050,11699,11532,10144,11943,984,4818,5404,7326,8584,11238,12335,12060,11918,10618,12302,57,27,171,171,270,182,79,84,53,-21,-49,2952,2952,3048,3016,3211,3386,3762,3761,3849,3894,3733,3733,11.365968049,11.063114692,10.493543648,10.871361237,10.181233865,10.119006106,9.5236931648,9.452359107,8.8428231807,8.7099422532,9.8820167082,9.9104824897,10.258639731,10.247901786,10.550023708,10.822771568,10.867639602,11.036602815,11.300275498,12.105013843,1.4839513411,1.1526322026,0.2349039173,0.6234594504,-0.368789842,-0.703765462,-1.343946438,-1.584243708,-2.457452317,-3.39507159,0.7438077092,0.8797348587,1.2691823591,1.430890542,1.3829619093,0.903482688,1.1026469636,1.1387673581,1.3560330597,0.9974064654,16.909717133,18.524702596,24.415983283,27.81378663,35.621147463,38.199882072,35.733703122,34.021412367,29.02025181,33.181129292,17.653524842,19.404437454,25.685165642,29.244677172,37.004109373,39.10336476,36.836350086,35.160179725,30.37628487,34.178535757 +050,3,5,45,053,South Carolina,Jasper County,24777,24791,24949,25303,25743,26348,26712,27490,28122,28556,29228,30294,31588,158,354,440,605,364,778,632,434,672,1066,1294,73,325,327,321,335,379,348,352,365,362,372,68,218,193,226,215,242,229,241,273,286,302,5,107,134,95,120,137,119,111,92,76,70,21,54,34,26,26,62,53,60,60,79,59,119,191,268,473,212,573,457,261,519,911,1168,140,245,302,499,238,635,510,321,579,990,1227,13,2,4,11,6,6,3,2,1,0,-3,1488,1488,1488,1443,1411,1435,1335,1425,1402,1235,1210,1247,12.934808565,12.811973514,12.324585821,12.627214474,13.984723811,12.515284471,12.421045203,12.63325488,12.163569773,12.02288226,8.6762715912,7.5618069976,8.6771227275,8.10403317,8.9295597948,8.2356325973,8.5041815166,9.4489824173,9.6098921407,9.7605119421,4.2585369737,5.2501665165,3.6474630934,4.5231813042,5.0551640161,4.2796518737,3.9168636861,3.184272463,2.5536776318,2.2623703177,2.1491681923,1.3321318027,0.9982530571,0.9800226159,2.2877384598,1.9060634395,2.1172236141,2.0766994324,2.6544806962,1.9068549821,7.601687495,10.500333033,18.16052677,7.9909536374,21.14313125,16.435301733,9.2099227213,17.96345009,30.61053056,37.74926473,9.7508556873,11.832464836,19.158779828,8.9709762533,23.43086971,18.341365173,11.327146335,20.040149522,33.265011256,39.656119712 +050,3,5,45,055,South Carolina,Kershaw County,61697,61586,61700,62125,62296,62601,63201,63677,64337,65219,65856,66748,67472,114,425,171,305,600,476,660,882,637,892,724,191,725,713,708,729,718,762,769,725,757,741,194,549,597,697,595,663,688,657,678,721,841,-3,176,116,11,134,55,74,112,47,36,-100,8,22,30,26,26,29,43,41,57,25,27,107,229,41,273,441,393,545,731,533,833,802,115,251,71,299,467,422,588,772,590,858,829,2,-2,-16,-5,-1,-1,-2,-2,0,-2,-5,401,401,401,402,403,402,402,400,402,400,400,400,11.710074702,11.461087758,11.33734197,11.589640864,11.317958984,11.904947896,11.871314335,11.062368873,11.41745347,11.041573536,8.8673531193,9.5964507599,11.161196826,9.459309073,10.45098441,10.748824347,10.142332273,10.345222201,10.874483424,12.531664432,2.8427215829,1.8646369986,0.1761451436,2.1303317912,0.866974574,1.156123549,1.7289820618,0.7171466718,0.5429700462,-1.490090896,0.3553401979,0.4822337065,0.4163430667,0.4133479595,0.4571320481,0.6718015217,0.6329309333,0.86973107,0.3770625321,0.4023245418,3.6987684232,0.6590527323,4.3716022002,7.0110173129,6.1949274106,8.5146937054,11.284695421,8.1327484265,12.563723568,11.950528982,4.054108621,1.1412864388,4.7879452669,7.4243652724,6.6520594587,9.1864952271,11.917626355,9.0024794965,12.9407861,12.352853524 +050,3,5,45,057,South Carolina,Lancaster County,76652,76653,76976,77872,79350,80698,83499,86346,89953,92517,95213,98280,100926,323,896,1478,1348,2801,2847,3607,2564,2696,3067,2646,205,927,884,870,957,1057,1079,992,1008,1006,1016,130,747,763,798,837,889,878,866,943,972,1123,75,180,121,72,120,168,201,126,65,34,-107,5,2,26,64,136,85,39,37,45,50,45,230,712,1301,1185,2467,2559,3349,2390,2578,2992,2718,235,714,1327,1249,2603,2644,3388,2427,2623,3042,2763,13,2,30,27,78,35,18,11,8,-9,-10,2114,2114,2113,2131,2118,2160,2096,1961,1913,1952,1997,1814,11.973031618,11.245245576,10.871738478,11.656729416,12.446642527,12.24056858,10.873020223,10.738827039,10.398308983,10.200495969,9.6481711097,9.7060207859,9.9720083975,10.195070555,10.468368218,9.9603514484,9.491971283,10.046343152,10.046875081,11.2747608,2.3248605084,1.5392247904,0.899730081,1.461658861,1.9782743089,2.2802171311,1.3810489396,0.6924838864,0.351433902,-1.074264831,0.0258317834,0.330742517,0.799760072,1.6565467091,1.0009125968,0.4424301896,0.4055461172,0.4794119214,0.5168145618,0.4517936207,9.1961148998,16.549846714,14.808057583,30.049270084,30.133356884,37.992274488,26.196087028,27.464976296,30.926183376,27.288334689,9.2219466832,16.880589231,15.607817655,31.705816793,31.134269481,38.434704678,26.601633145,27.944388217,31.442997938,27.740128309 +050,3,5,45,059,South Carolina,Laurens County,66537,66529,66519,66462,66239,66177,66490,66459,66651,66858,66855,67448,67883,-10,-57,-223,-62,313,-31,192,207,-3,593,435,203,811,782,738,743,733,784,772,783,799,778,153,733,781,873,786,833,795,894,912,916,940,50,78,1,-135,-43,-100,-11,-122,-129,-117,-162,5,18,16,21,56,54,41,59,60,72,54,-60,-150,-236,59,306,23,165,274,68,639,543,-55,-132,-220,80,362,77,206,333,128,711,597,-5,-3,-4,-7,-6,-8,-3,-4,-2,-1,0,2402,2402,2396,2402,2413,2418,2341,2320,2282,2260,2237,2239,12.197231183,11.785894605,11.146689222,11.200976882,11.026784707,11.77973105,11.564763424,11.711651074,11.898468389,11.497735183,11.024131267,11.770823129,13.185717738,11.849216459,12.531120956,11.945007888,13.392355572,13.641156806,13.640797302,13.891865131,1.1730999165,0.0150714765,-2.039028516,-0.648239577,-1.504336249,-0.165276839,-1.827592147,-1.929505732,-1.742328913,-2.394129948,0.2707153654,0.2411436236,0.3171822136,0.8442189844,0.8123415746,0.6160318534,0.8838355467,0.8974445267,1.072202408,0.798043316,-2.255961378,-3.556868449,0.8911309812,4.613053736,0.3459973373,2.4791525806,4.1045921998,1.0171037969,9.5157963709,8.0247689,-1.985246013,-3.315724825,1.2083131948,5.4572727204,1.1583389119,3.0951844339,4.9884277464,1.9145483236,10.587998779,8.822812216 +050,3,5,45,061,South Carolina,Lee County,19220,19225,19221,18887,18634,18381,18339,17813,17508,17385,17269,16856,16701,-4,-334,-253,-253,-42,-526,-305,-123,-116,-413,-155,48,164,200,178,182,171,174,179,177,175,167,18,251,230,214,202,229,242,261,269,238,299,30,-87,-30,-36,-20,-58,-68,-82,-92,-63,-132,1,-1,-3,0,0,1,0,-1,-1,0,0,-36,-248,-225,-221,-18,-476,-239,-39,-22,-350,-23,-35,-249,-228,-221,-18,-475,-239,-40,-23,-350,-23,1,2,5,4,-4,7,2,-1,-1,0,0,1975,1975,1975,1973,1950,2014,1712,1547,1600,1705,1507,1657,8.6071166159,10.660696677,9.6177225449,9.9128540305,9.4600575349,9.8524956825,10.259937523,10.215270964,10.256410256,9.9532139345,13.173087016,12.259801178,11.562879914,11.002178649,12.66873202,13.702896294,14.960020635,15.52490333,13.948717949,17.820424949,-4.5659704,-1.599104501,-1.945157369,-1.089324619,-3.208674486,-3.850400612,-4.700083111,-5.309632366,-3.692307692,-7.867211014,-0.052482418,-0.15991045,0,0,0.0553219739,0,-0.057318087,-0.057713395,0,0,-13.01563976,-11.99328376,-11.94110496,-0.980392157,-26.33325957,-13.53302568,-2.235405382,-1.269694696,-20.51282051,-1.370801919,-13.06812218,-12.15319421,-11.94110496,-0.980392157,-26.2779376,-13.53302568,-2.292723469,-1.327408091,-20.51282051,-1.370801919 +050,3,5,45,063,South Carolina,Lexington County,262391,262454,263365,266409,269868,273363,277568,281855,286521,290511,294766,299421,303946,911,3044,3459,3495,4205,4287,4666,3990,4255,4655,4525,886,3298,3190,3330,3167,3194,3312,3134,3263,3196,3202,607,2180,2134,2270,2213,2374,2407,2513,2636,2645,2844,279,1118,1056,1060,954,820,905,621,627,551,358,85,268,340,398,511,536,320,406,451,457,378,531,1657,2055,2034,2720,2918,3439,2965,3179,3656,3798,616,1925,2395,2432,3231,3454,3759,3371,3630,4113,4176,16,1,8,3,20,13,2,-2,-2,-9,-9,2320,2320,2325,2306,2314,2324,2326,2330,2322,2342,2342,2342,12.450592139,11.896836896,12.259977799,11.496902516,11.418908411,11.654257041,10.862482497,11.150275852,10.757556123,10.613772381,8.2299244584,7.9585736476,8.3574022837,8.0336739083,8.4873163956,8.4697453798,8.7100888686,9.0077006272,8.9029211343,9.4270982669,4.2206676809,3.9382632483,3.9025755158,3.4632286076,2.9315920153,3.1845116613,2.1523936281,2.1425752251,1.8546349886,1.1866741138,1.0117521811,1.2680014246,1.4653066559,1.8550417384,1.9162601466,1.1260151731,1.4072009871,1.5411506005,1.5382362792,1.252968757,6.2554976273,7.6639497871,7.4885269802,9.8741947721,10.43217744,12.101144313,10.276726421,10.863232281,12.305890233,12.589352749,7.2672498084,8.9319512118,8.9538336362,11.729236511,12.348437587,13.227159486,11.683927408,12.404382882,13.844126512,13.842321506 +050,3,5,45,065,South Carolina,McCormick County,10233,10229,10210,10017,9926,9881,9816,9671,9597,9568,9417,9462,9430,-19,-193,-91,-45,-65,-145,-74,-29,-151,45,-32,19,57,52,57,52,83,62,47,52,48,48,50,111,116,123,114,131,134,145,143,150,184,-31,-54,-64,-66,-62,-48,-72,-98,-91,-102,-136,0,-2,-3,-2,-2,-1,0,-1,-2,-3,0,14,-139,-23,25,1,-96,-1,71,-57,151,104,14,-141,-26,23,-1,-97,-1,70,-59,148,104,-2,2,-1,-2,-2,0,-1,-1,-1,-1,0,1306,1306,1306,1306,1306,1286,1165,1123,1109,976,979,948,5.6360310476,5.2148623577,5.7555409704,5.2799918769,8.5184995125,6.435540793,4.9047743282,5.4780089544,5.0850150961,5.0815159856,10.975428882,11.63315449,12.419851568,11.575366807,13.444860676,13.909072037,15.131750587,15.064524625,15.890672175,19.479144611,-5.339397835,-6.418292133,-6.664310597,-6.29537493,-4.926361164,-7.473531244,-10.22697626,-9.58651567,-10.80565708,-14.39762863,-0.197755475,-0.300857444,-0.201948806,-0.203076611,-0.102632524,0,-0.104356901,-0.210692652,-0.317813444,0,-13.74400554,-2.306573735,2.5243600747,0.1015383053,-9.852722328,-0.103799045,7.4093399426,-6.004740585,15.99660999,11.009951302,-13.94176101,-2.607431179,2.3224112687,-0.101538305,-9.955354852,-0.103799045,7.304983042,-6.215433237,15.678796546,11.009951302 +050,3,5,45,067,South Carolina,Marion County,33062,33055,32951,32774,32398,32075,31947,31769,31772,31288,30989,30565,30158,-104,-177,-376,-323,-128,-178,3,-484,-299,-424,-407,112,408,421,367,402,393,390,362,341,335,317,145,381,424,427,440,445,389,442,429,446,482,-33,27,-3,-60,-38,-52,1,-80,-88,-111,-165,6,7,7,18,49,35,11,12,5,20,15,-80,-211,-389,-284,-133,-160,-7,-417,-213,-333,-254,-74,-204,-382,-266,-84,-125,4,-405,-208,-313,-239,3,0,9,3,-6,-1,-2,1,-3,0,-3,203,203,203,200,203,205,204,201,202,200,200,200,12.41536706,12.919658749,11.384610612,12.558183125,12.33599096,12.275538629,11.481129083,10.95107343,10.8847516,10.440854371,11.593761887,13.011722826,13.245854854,13.745275062,13.968234039,12.244062889,14.018395179,13.777156896,14.491340936,15.875368477,0.8216051731,-0.092064077,-1.861244242,-1.187091937,-1.632243079,0.0314757401,-2.537266096,-2.826083466,-3.606589336,-5.434514105,0.2130087486,0.2148161787,0.5583732725,1.5307238137,1.0986251491,0.3462331408,0.3805899144,0.1605729242,0.6498359164,0.4940467368,-6.420692278,-11.93764193,-8.809889411,-4.15482178,-5.022286396,-0.220330181,-13.22549952,-6.840406571,-10.81976801,-8.365858077,-6.20768353,-11.72282575,-8.251516139,-2.624097966,-3.923661247,0.1259029603,-12.84490961,-6.679833646,-10.16993209,-7.87181134 +050,3,5,45,069,South Carolina,Marlboro County,28933,28935,28918,28589,28263,28069,28049,27594,27023,26708,26413,26157,25581,-17,-329,-326,-194,-20,-455,-571,-315,-295,-256,-576,78,284,308,306,319,302,338,260,290,269,271,52,304,318,374,351,363,380,356,354,331,388,26,-20,-10,-68,-32,-61,-42,-96,-64,-62,-117,1,8,5,11,10,11,7,4,6,6,3,-43,-319,-328,-133,5,-409,-540,-223,-237,-200,-459,-42,-311,-323,-122,15,-398,-533,-219,-231,-194,-456,-1,2,7,-4,-3,4,4,0,0,0,-3,3291,3292,3331,3335,3317,3341,3198,2938,2788,2728,2714,2451,9.8770584451,10.835150918,10.864162465,11.368901244,10.854914365,12.377098706,9.6778396084,10.918469155,10.233973749,10.475859136,10.572625941,11.186941532,13.278420791,12.509355287,13.047463293,13.915081385,13.251195772,13.328062348,12.592733498,14.998647029,-0.695567496,-0.351790614,-2.414258326,-1.140454043,-2.192548928,-1.537982679,-3.573356163,-2.409593193,-2.358759749,-4.522787893,0.2782269985,0.1758953071,0.390541788,0.3563918885,0.3953776755,0.2563304466,0.1488898401,0.2258993618,0.2282670725,0.1159689203,-11.09430156,-11.53873215,-4.722005255,0.1781959443,-14.70086085,-19.77406302,-8.300608587,-8.923024792,-7.608902416,-17.74324481,-10.81607456,-11.36283684,-4.331463467,0.5345878328,-14.30548317,-19.51773257,-8.151718747,-8.697125431,-7.380635343,-17.62727589 +050,3,5,45,071,South Carolina,Newberry County,37508,37510,37611,37507,37542,37474,37675,37787,37957,38377,38460,38408,38445,101,-104,35,-68,201,112,170,420,83,-52,37,126,435,418,454,447,446,470,429,426,385,412,56,447,454,401,406,446,461,439,424,447,497,70,-12,-36,53,41,0,9,-10,2,-62,-85,10,35,22,25,11,17,-8,-5,-2,-9,-1,25,-126,54,-141,156,98,171,434,84,20,120,35,-91,76,-116,167,115,163,429,82,11,119,-4,-1,-5,-5,-7,-3,-2,1,-1,-1,3,1168,1168,1168,1176,1170,1198,1190,1217,1292,1308,1310,1310,11.581778003,11.139388933,12.104084462,11.896365886,11.820518937,12.410223912,11.240076506,11.088407928,10.017172295,10.72176753,11.901275327,12.098762142,10.691052575,10.805200335,11.820518937,12.172581327,11.502082951,11.036349675,11.630327314,12.933782676,-0.319497324,-0.95937321,1.4130318865,1.0911655511,0,0.2376425856,-0.262006445,0.0520582532,-1.613155019,-2.212015146,0.9318671956,0.586283628,0.6665244748,0.2927517332,0.4505578967,-0.211237854,-0.131003223,-0.052058253,-0.234167664,-0.026023708,-3.354721904,1.4390598143,-3.759198038,4.151751853,2.5973337574,4.5152091255,11.371079729,2.1864466338,0.5203725868,3.1228449117,-2.422854709,2.0253434423,-3.092673563,4.4445035862,3.0478916541,4.3039712717,11.240076506,2.1343883806,0.2862049227,3.0968212041 +050,3,5,45,073,South Carolina,Oconee County,74273,74285,74349,74265,74574,74962,75254,75908,76508,77382,78215,79450,80015,64,-84,309,388,292,654,600,874,833,1235,565,204,800,814,792,748,822,726,751,705,697,695,230,793,810,879,858,876,881,884,986,977,1045,-26,7,4,-87,-110,-54,-155,-133,-281,-280,-350,4,11,26,82,129,133,99,123,136,142,123,90,-99,280,391,276,573,656,884,975,1375,794,94,-88,306,473,405,706,755,1007,1111,1517,917,-4,-3,-1,2,-3,2,0,0,3,-2,-2,795,795,795,795,794,794,793,793,792,792,792,792,10.766145854,10.937993402,10.592766959,9.9589923843,10.875749196,9.5265588915,9.7602183378,9.0618713728,8.8415310944,8.716646286,10.671942078,10.884244049,11.75636636,11.423550088,11.590214472,11.560466093,11.488725713,12.673766204,12.39336568,13.106324272,0.0942037762,0.0537493533,-1.163599401,-1.464557704,-0.714465276,-2.033907201,-1.728507375,-3.611894831,-3.551834586,-4.389677986,0.1480345055,0.3493707966,1.096725872,1.7175267615,1.7597015123,1.2990762125,1.5985444148,1.7481056833,1.80128754,1.5426582636,-1.332310549,3.762454733,5.2295099508,3.6747084199,7.5812704251,8.6080201554,11.488725713,12.532375303,17.442044842,9.9582980591,-1.184276044,4.1118255296,6.3262358228,5.3922351813,9.3409719374,9.9070963678,13.087270128,14.280480986,19.243332382,11.500956323 +050,3,5,45,075,South Carolina,Orangeburg County,92501,92508,92323,91706,91471,90682,90058,89174,88421,87664,87106,86231,85343,-185,-617,-235,-789,-624,-884,-753,-757,-558,-875,-888,306,1196,1144,1066,1061,996,981,956,1010,951,942,269,1056,957,1058,1036,1062,1063,1012,1092,1169,1233,37,140,187,8,25,-66,-82,-56,-82,-218,-291,5,9,20,26,63,57,34,32,44,19,24,-234,-766,-436,-836,-714,-881,-703,-733,-518,-675,-617,-229,-757,-416,-810,-651,-824,-669,-701,-474,-656,-593,7,0,-6,13,2,6,-2,0,-2,-1,-4,3300,3305,3310,3319,3152,3097,2923,2971,2992,3013,3035,3032,12.99795141,12.490651119,11.704446262,11.740621888,11.11408677,11.047608322,10.858392254,11.55804772,10.972844805,10.980684719,11.476452081,10.448910071,11.616608016,11.46398141,11.8505624,11.971057744,11.494448704,12.496423871,13.488176212,14.372807069,1.5214993289,2.0417410483,0.0878382459,0.276640478,-0.736475629,-0.923449421,-0.63605645,-0.938376152,-2.515331406,-3.39212235,0.0978106711,0.2183680266,0.2854742991,0.6971340046,0.6360471344,0.3828936625,0.3634608286,0.5035189106,0.2192261318,0.279762668,-8.3247749,-4.760422979,-9.179096693,-7.900852053,-9.83083378,-7.916889552,-8.325524605,-5.927790811,-7.788296786,-7.192231923,-8.226964228,-4.542054952,-8.893622394,-7.203718048,-9.194786645,-7.53399589,-7.962063776,-5.4242719,-7.569070654,-6.912469255 +050,3,5,45,077,South Carolina,Pickens County,119224,119384,119344,119735,119863,119333,120651,121637,123180,123590,125176,126974,127983,-40,391,128,-530,1318,986,1543,410,1586,1798,1009,288,1210,1203,1148,1234,1291,1262,1160,1133,1252,1212,248,1036,1101,1126,1190,1206,1176,1195,1252,1280,1369,40,174,102,22,44,85,86,-35,-119,-28,-157,40,166,216,183,294,261,177,146,158,176,134,-116,55,-176,-743,971,647,1276,306,1540,1647,1031,-76,221,40,-560,1265,908,1453,452,1698,1823,1165,-4,-4,-14,8,9,-7,4,-7,7,3,1,7053,7054,7033,7021,6597,6801,6863,7151,7178,7721,8295,8297,10.122177188,10.041820049,9.5988227228,10.284018935,10.656739087,10.309741562,9.401466953,9.1089618356,9.9305968669,9.507485576,8.6665913777,9.1903939098,9.4148731584,9.9173278219,9.9550947633,9.6071759723,9.6851319042,10.065684217,10.152686893,10.739065803,1.4555858105,0.8514261388,0.1839495644,0.3666911127,0.7016443241,0.7025655898,-0.283664951,-0.956722382,-0.222090026,-1.231580227,1.388662325,1.8030200586,1.5301259218,2.4501633442,2.154460807,1.4459780162,1.183288082,1.270270053,1.3959944477,1.0511576462,0.4600989631,-1.469127455,-6.21247847,8.0922061471,5.3407515023,10.424112705,2.4800421445,12.381113175,13.063652588,8.0876383076,1.8487612881,0.3338926034,-4.682352548,10.542369491,7.4952123093,11.870090721,3.6633302265,13.651383228,14.459647035,9.1387959538 +050,3,5,45,079,South Carolina,Richland County,384504,384425,385754,389333,393205,397015,400688,406455,409569,412492,415159,417027,419051,1329,3579,3872,3810,3673,5767,3114,2923,2667,1868,2024,1212,4826,4893,4746,4798,4910,4976,4685,4748,4658,4713,566,2611,2711,2964,2946,3040,3011,3034,3199,3168,3440,646,2215,2182,1782,1852,1870,1965,1651,1549,1490,1273,276,704,1416,1055,1026,1326,905,1032,1112,1044,874,404,667,369,1018,852,2566,256,257,11,-680,-154,680,1371,1785,2073,1878,3892,1161,1289,1123,364,720,3,-7,-95,-45,-57,5,-12,-17,-5,14,31,32002,32107,31924,31433,30124,30116,31062,31755,31662,30433,29369,28576,12.452795622,12.505462993,12.011844803,12.029539816,12.166369528,12.195719734,11.398180914,11.473435059,11.194612743,11.274067731,6.737308199,6.928737007,7.501708385,7.3862076487,7.5327420296,7.3796849112,7.3814473622,7.7303114477,7.6136825181,8.2288973038,5.7154874227,5.5767259865,4.5101364177,4.6433321675,4.6336274985,4.8160348225,4.0167335514,3.7431236113,3.5809302247,3.0451704267,1.8165702689,3.6189935824,2.670142492,2.5723859632,3.2856631353,2.2180720175,2.5107625833,2.687122954,2.5090544662,2.0907140243,1.7210971155,0.943085192,2.5764976842,2.1361333729,6.3582289631,0.6274325265,0.6252577363,0.0265812522,-1.634250035,-0.368386682,3.5376673844,4.5620787744,5.2466401762,4.7085193361,9.6438920984,2.845504544,3.1360203197,2.7137042062,0.8748044307,1.7223273427 +050,3,5,45,081,South Carolina,Saluda County,19875,19857,19905,19797,19858,20053,20061,20155,20171,20262,20333,20381,20315,48,-108,61,195,8,94,16,91,71,48,-66,55,240,272,228,254,278,241,216,240,222,224,27,202,215,201,206,241,217,227,195,198,235,28,38,57,27,48,37,24,-11,45,24,-11,6,-4,-5,62,74,65,15,3,2,7,8,15,-142,14,107,-110,-7,-20,98,26,17,-63,21,-146,9,169,-36,58,-5,101,28,24,-55,-1,0,-5,-1,-4,-1,-3,1,-2,0,0,239,239,239,266,261,264,276,287,298,298,298,298,12.090071029,13.718320514,11.425421563,12.663907863,13.825343147,11.952586421,10.684341998,11.82411627,10.905339687,11.008452919,10.175809783,10.843525407,10.072411115,10.270728424,11.985279491,10.762287358,11.228452007,9.6070944698,9.7263840448,11.549046589,1.9142612463,2.8747951078,1.3530104482,2.3931794386,1.8400636563,1.1902990626,-0.544110009,2.2170218007,1.1789556418,-0.54059367,-0.201501184,-0.252175009,3.1069128812,3.6894849678,3.232544261,0.7439369141,0.1483936389,0.0985343023,0.3438620622,0.3931590328,-7.153292026,0.7060900265,5.3619302949,-5.484369547,-0.348120151,-0.991915886,4.8475255361,1.2809459293,0.8350935796,-3.096127384,-7.354793209,0.453915017,8.4688431761,-1.794884579,2.8844241098,-0.247978971,4.9959191749,1.3794802316,1.1789556418,-2.702968351 +050,3,5,45,083,South Carolina,Spartanburg County,284307,284329,284769,286180,288283,290545,293146,296741,301027,306979,314490,320254,326205,440,1411,2103,2262,2601,3595,4286,5952,7511,5764,5951,901,3683,3575,3516,3517,3569,3579,3776,3853,3947,3942,593,2743,2764,2899,2939,3095,2979,3107,3273,3275,3518,308,940,811,617,578,474,600,669,580,672,424,46,123,105,142,190,269,211,271,309,309,259,117,360,1220,1508,1842,2841,3470,4990,6606,4787,5290,163,483,1325,1650,2032,3110,3681,5261,6915,5096,5549,-31,-12,-33,-5,-9,11,5,22,16,-4,-22,7986,7986,7960,7991,8079,8213,8216,8227,8236,8111,7890,7711,12.901327439,12.44640647,12.148686656,12.050896793,12.100622662,11.974545309,12.420930057,12.39965308,12.436509837,12.195669022,9.6085639873,9.6228999953,10.016792553,10.070396837,10.493535203,9.9670775284,10.220293879,10.533107846,10.319120779,10.883907564,3.2927634517,2.8235064747,2.1318941033,1.9804999563,1.6070874591,2.0074677801,2.2006361779,1.866545234,2.1173890576,1.3117614574,0.4308616006,0.3655587914,0.490646617,0.6510293974,0.9120390855,0.7059595027,0.8914385713,0.9944180643,0.9736208613,0.8012882488,1.2610583432,4.2474450052,5.2105288618,6.3115586843,9.6323533151,11.609855328,16.414311701,21.259306578,15.083246159,16.366080447,1.6919199438,4.6130037966,5.7011754787,6.9625880817,10.544392401,12.315814831,17.305750272,22.253724643,16.05686702,17.167368696 +050,3,5,45,085,South Carolina,Sumter County,107456,107485,107610,107316,107944,107840,107784,107346,107257,106604,106518,106635,106360,125,-294,628,-104,-56,-438,-89,-653,-86,117,-275,368,1516,1567,1524,1507,1496,1426,1362,1376,1398,1366,192,1052,979,1044,1023,1153,1097,1138,1182,1206,1200,176,464,588,480,484,343,329,224,194,192,166,60,84,246,149,169,174,87,74,49,92,74,-105,-844,-183,-730,-711,-962,-502,-952,-325,-168,-517,-45,-760,63,-581,-542,-788,-415,-878,-276,-76,-443,-6,2,-23,-3,2,7,-3,1,-4,1,2,2781,2777,2722,2732,2643,2628,2695,2670,2659,2638,2547,2544,14.107181076,14.559137787,14.125236347,13.97803584,13.90786966,13.289655783,12.73724522,12.912791734,13.11733825,12.826592174,9.789415892,9.0959769581,9.6763430097,9.4887396579,10.719100079,10.223529028,10.642426623,11.092238249,11.3158154,11.267870138,4.3177651843,5.4631608288,4.4488933378,4.4892961822,3.1887695812,3.066126755,2.0948185971,1.8205534858,1.8015228498,1.5587220357,0.7816643868,2.2856081018,1.3810106403,1.5675435017,1.6176265514,0.8107994762,0.6920382866,0.4598305196,0.8632296989,0.6948519918,-7.853865982,-1.700269442,-6.766025285,-6.594813193,-8.943429554,-4.678406173,-8.902979038,-3.049896304,-1.576332494,-4.854574051,-7.072201595,0.5853386602,-5.385014644,-5.027269692,-7.325803003,-3.867606697,-8.210940751,-2.590065784,-0.713102795,-4.159722059 +050,3,5,45,087,South Carolina,Union County,28961,28956,28914,28654,28193,27991,27912,27731,27651,27433,27327,27221,26991,-42,-260,-461,-202,-79,-181,-80,-218,-106,-106,-230,78,308,299,304,317,317,320,313,314,279,280,58,364,386,387,381,383,427,401,367,411,411,20,-56,-87,-83,-64,-66,-107,-88,-53,-132,-131,0,-2,-3,0,0,-1,-1,-1,-1,-1,-1,-63,-202,-377,-119,-9,-112,29,-127,-51,28,-100,-63,-204,-380,-119,-9,-113,28,-128,-52,27,-101,1,0,6,0,-6,-2,-1,-2,-1,-1,2,503,503,503,459,503,498,486,492,452,444,445,444,10.700389105,10.519464528,10.821586217,11.34107293,11.394065741,11.55610126,11.36446155,11.468224982,10.229522622,10.329816277,12.645914397,13.580312066,13.776164032,13.630753269,13.766331794,15.420172619,14.55958173,13.403944485,15.069296766,15.162694606,-1.945525292,-3.060847538,-2.954577816,-2.289680339,-2.372266053,-3.864071359,-3.19512018,-1.935719503,-4.839774144,-4.83287833,-0.069483046,-0.105546467,0,0,-0.035943425,-0.036112816,-0.036308184,-0.036523009,-0.036664956,-0.036892201,-7.01778766,-13.26367267,-4.236081447,-0.321986298,-4.025663605,1.0472716767,-4.611139351,-1.862673484,1.0266187578,-3.689220099,-7.087270706,-13.36921913,-4.236081447,-0.321986298,-4.061607031,1.0111588603,-4.647447535,-1.899196494,0.9899538022,-3.7261123 +050,3,5,45,089,South Carolina,Williamsburg County,34423,34405,34342,34101,33554,33069,32728,32515,31876,31185,30907,30256,29825,-63,-241,-547,-485,-341,-213,-639,-691,-278,-651,-431,92,355,356,333,341,350,315,360,287,288,271,94,412,412,418,424,418,415,415,451,437,445,-2,-57,-56,-85,-83,-68,-100,-55,-164,-149,-174,2,16,15,8,35,39,13,21,25,11,15,-64,-200,-523,-416,-295,-184,-555,-661,-137,-512,-271,-62,-184,-508,-408,-260,-145,-542,-640,-112,-501,-256,1,0,17,8,2,0,3,4,-2,-1,-1,1476,1476,1478,1481,1478,1482,1441,1283,1117,1255,977,919,10.373595547,10.523981967,9.9965477388,10.365214219,10.729120365,9.7839760215,11.417516373,9.2443470979,9.4174582673,9.0211547744,12.039215113,12.179439805,12.548219083,12.888125598,12.813635179,12.890000155,13.161859152,14.526831154,14.28968494,14.813335331,-1.665619567,-1.655457838,-2.551671345,-2.522911379,-2.084514814,-3.106024134,-1.744342779,-5.282484056,-4.872226673,-5.792180556,0.4675423345,0.4434262065,0.240157303,1.0638782923,1.195530555,0.4037831374,0.6660217884,0.8052567158,0.3596945866,0.49932591,-5.844279181,-15.46079373,-12.48817976,-8.966974178,-5.640451849,-17.23843394,-20.96382867,-4.412806803,-16.74214803,-9.021154774,-5.376736847,-15.01736753,-12.24802245,-7.903095886,-4.444921294,-16.83465081,-20.29780689,-3.607550087,-16.38245344,-8.521828864 +050,3,5,45,091,South Carolina,York County,226073,226033,226871,230131,234151,238736,244661,250785,258140,266502,274188,281499,289105,838,3260,4020,4585,5925,6124,7355,8362,7686,7311,7606,743,2843,2929,2887,2965,2872,2977,2985,2955,2948,2969,416,1790,1839,1888,1913,2090,2040,2084,2235,2185,2465,327,1053,1090,999,1052,782,937,901,720,763,504,27,87,100,154,210,216,159,230,268,313,240,465,2113,2780,3376,4554,5070,6233,7198,6685,6248,6899,492,2200,2880,3530,4764,5286,6392,7428,6953,6561,7139,19,7,50,56,109,56,26,33,13,-13,-37,3905,3906,3908,3919,3950,3914,3913,3897,3832,3462,3424,3426,12.441958679,12.617331708,12.210105163,12.267349611,11.593594458,11.699169819,11.379188094,10.930477723,10.610289605,10.406516603,7.8336637476,7.9219095291,7.984994301,7.9148194962,8.4368427639,8.0168983642,7.9444649876,8.2672141153,7.8641393446,8.6399674731,4.6082949309,4.6954221788,4.2251108616,4.352530115,3.1567516944,3.6822714545,3.4347231064,2.6632636076,2.7461502608,1.7665491304,0.3807423162,0.430772677,0.6513183911,0.8688510686,0.8719416445,0.6248464902,0.8767883623,0.9913258984,1.1265334622,0.8412138716,9.247224301,11.975480419,14.278252521,18.84165603,20.466408044,24.494768384,27.439663618,24.727662801,22.487479462,24.181393751,9.6279666172,12.406253096,14.929570912,19.710507099,21.338349689,25.119614874,28.316451981,25.7189887,23.614012925,25.022607623 +040,2,4,46,000,South Dakota,South Dakota,814180,814198,816193,823740,833859,842751,849670,854663,863693,873732,879386,887127,892717,1995,7547,10119,8892,6919,4993,9030,10039,5654,7741,5590,3030,11790,11896,12055,12436,12262,12223,12260,12148,11697,11686,1931,7287,7409,7279,7158,7742,7750,8075,7924,7455,7920,1099,4503,4487,4776,5278,4520,4473,4185,4224,4242,3766,198,1369,2242,228,1189,1734,3337,3846,638,2334,1856,685,1676,3287,3790,370,-1226,1240,2012,798,1160,-21,883,3045,5529,4018,1559,508,4577,5858,1436,3494,1835,13,-1,103,98,82,-35,-20,-4,-6,5,-11,34050,34047,34010,33988,33980,34017,33969,33969,34019,34040,34024,34043,14.3786362,14.353290512,14.380207681,14.696106938,14.389206804,14.226388478,14.112839403,13.858736263,13.243038687,13.131487928,8.8869484302,8.9394358949,8.6829972385,8.4588881844,9.0850790309,9.0202495874,9.2953652676,9.0398934926,8.4403567933,8.8996563744,5.4916877702,5.4138546174,5.6972104425,6.2372187535,5.3041277732,5.2061388909,4.8174741356,4.8188427704,4.8026818937,4.2318315538,1.6695804036,2.7051174621,0.2719773829,1.4050877412,2.0348136192,3.8839448869,4.4272414637,0.7278460434,2.6424939981,2.0855760392,2.0439859433,3.9659772961,4.5210275496,0.4372434518,-1.438685984,1.443239934,2.3160711973,0.9103779666,1.3133217814,-0.023597574,3.7135663469,6.6710947581,4.7930049326,1.842331193,0.5961276347,5.3271848208,6.743312661,1.63822401,3.9558157794,2.0619784655 +050,2,4,46,003,South Dakota,Aurora County,2710,2710,2701,2716,2763,2716,2744,2745,2772,2759,2775,2749,2730,-9,15,47,-47,28,1,27,-13,16,-26,-19,3,34,38,29,39,45,49,35,44,33,38,10,24,31,29,36,23,23,24,40,23,24,-7,10,7,0,3,22,26,11,4,10,14,0,0,3,0,2,11,17,14,1,7,5,-1,5,37,-47,22,-32,-17,-36,11,-43,-39,-1,5,40,-47,24,-21,0,-22,12,-36,-34,-1,0,0,0,1,0,1,-2,0,0,1,96,96,96,96,96,96,95,95,95,95,95,96,12.553073657,13.871144369,10.585873335,14.285714286,16.396429222,17.763277143,12.655939251,15.901698591,11.947863867,13.871144369,8.8609931697,11.315933565,10.585873335,13.186813187,8.380397158,8.3378647816,8.6783583439,14.456089628,8.3272990587,8.7607227596,3.6920804874,2.5552108049,0,1.0989010989,8.0160320641,9.4254123618,3.9775809076,1.4456089628,3.6205648081,5.1104216098,0,1.095090345,0,0.7326007326,4.0080160321,6.1627696212,5.0623757006,0.3614022407,2.5343953657,1.8251505749,1.8460402437,13.506114254,-17.1564154,8.0586080586,-11.659683,-6.162769621,-13.01753752,3.9754246476,-15.56842867,-14.23617448,1.8460402437,14.601204599,-17.1564154,8.7912087912,-7.65166697,0,-7.955161815,4.3368268883,-13.03403331,-12.41102391 +050,2,4,46,005,South Dakota,Beadle County,17398,17399,17406,17712,18003,18217,18073,18146,18154,18397,18239,18389,18513,7,306,291,214,-144,73,8,243,-158,150,124,68,304,294,353,317,348,318,322,274,292,287,65,205,200,173,191,196,201,203,168,185,202,3,99,94,180,126,152,117,119,106,107,85,9,135,153,27,129,214,272,340,78,177,148,-4,73,47,9,-411,-296,-382,-216,-343,-134,-109,5,208,200,36,-282,-82,-110,124,-265,43,39,-1,-1,-3,-2,12,3,1,0,1,0,0,620,620,620,620,620,620,620,620,620,620,621,620,17.31305883,16.463670727,19.491993374,17.470377514,19.216433364,17.520661157,17.619216984,14.957964843,15.944086491,15.554712482,11.67492454,11.199776004,9.5527332965,10.526315789,10.823048676,11.074380165,11.107767229,9.1713069112,10.101561647,10.947916102,5.6381342901,5.2638947221,9.9392600773,6.944061725,8.3933846876,6.4462809917,6.5114497551,5.7866579321,5.8425248444,4.6067963796,7.6883649411,8.5678286434,1.4908890116,7.109396528,11.817002126,14.986225895,18.604142158,4.2581067802,9.6647373594,8.021245461,4.1574121533,2.6319473611,0.4969630039,-22.65086801,-16.34501229,-21.04683196,-11.81910208,-18.72475161,-7.316806814,-5.907538887,11.845777094,11.199776004,1.9878520155,-15.54147148,-4.52801016,-6.060606061,6.785040081,-14.46664483,2.3479305449,2.1137065742 +050,2,4,46,007,South Dakota,Bennett County,3431,3431,3451,3450,3451,3467,3440,3407,3458,3447,3482,3364,3399,20,-1,1,16,-27,-33,51,-11,35,-118,35,21,67,82,69,71,55,82,56,70,42,46,7,37,33,25,29,38,30,46,46,26,30,14,30,49,44,42,17,52,10,24,16,16,0,0,0,0,0,0,2,2,0,1,1,5,-31,-49,-28,-72,-51,-2,-22,11,-136,18,5,-31,-49,-28,-72,-51,0,-20,11,-135,19,1,0,1,0,3,1,-1,-1,0,1,0,37,37,37,37,37,37,37,37,37,37,37,37,19.417475728,23.764671787,19.947961839,20.558853337,16.065430115,23.889293518,16.22013034,20.204935777,12.26993865,13.60343043,10.723083611,9.5638313288,7.2275224053,8.3972781236,11.099751716,8.7399854334,13.323678494,13.277529225,7.5956763073,8.8718024545,8.6943921171,14.200840458,12.720439433,12.161575214,4.9656783993,15.149308084,2.8964518465,6.9274065522,4.674262343,4.7316279758,0,0,0,0,0,0.5826656956,0.5792903693,0,0.2921413964,0.2957267485,-8.984205188,-14.20084046,-8.094825094,-20.84841465,-14.8970352,-0.582665696,-6.372194062,3.1750613364,-39.73122992,5.3230814727,-8.984205188,-14.20084046,-8.094825094,-20.84841465,-14.8970352,0,-5.792903693,3.1750613364,-39.43908852,5.6188082212 +050,2,4,46,009,South Dakota,Bon Homme County,7070,7067,7061,7016,7028,6982,6977,6942,6939,6955,6919,6911,6848,-6,-45,12,-46,-5,-35,-3,16,-36,-8,-63,17,63,66,67,58,62,69,69,70,70,71,25,66,71,88,63,72,91,67,92,70,77,-8,-3,-5,-21,-5,-10,-22,2,-22,0,-6,0,3,4,0,0,3,0,0,0,0,0,2,-45,15,-23,-1,-26,18,13,-13,-8,-57,2,-42,19,-23,-1,-23,18,13,-13,-8,-57,0,0,-2,-2,1,-2,1,1,-1,0,0,1556,1555,1554,1552,1549,1542,1536,1534,1536,1531,1530,1534,8.9507707608,9.3990316149,9.5645967166,8.3100508632,8.9086859688,9.9416468554,9.9323448971,10.090817356,10.122921186,10.320517479,9.3769979399,10.111079465,12.562455389,9.0264345583,10.345570803,13.111447302,9.6444508421,13.262217097,10.122921186,11.192673886,-0.426227179,-0.71204785,-2.997858672,-0.716383695,-1.436884834,-3.169800447,0.287894055,-3.171399741,0,-0.872156407,0.4262271791,0.5696382797,0,0,0.4310654501,0,0,0,0,0,-6.393407686,2.1361435488,-3.283369022,-0.143276739,-3.735900568,2.5934730927,1.8713113574,-1.874008938,-1.156905278,-8.285485864,-5.967180507,2.7057818285,-3.283369022,-0.143276739,-3.304835117,2.5934730927,1.8713113574,-1.874008938,-1.156905278,-8.285485864 +050,2,4,46,011,South Dakota,Brookings County,31965,31966,32003,32151,32799,33059,33304,33861,34371,34871,35266,35463,35603,37,148,648,260,245,557,510,500,395,197,140,94,368,394,409,425,441,445,432,461,409,419,54,185,205,197,197,194,181,204,186,190,217,40,183,189,212,228,247,264,228,275,219,202,11,94,178,12,117,165,377,438,110,309,239,-11,-130,274,42,-99,147,-128,-166,9,-332,-301,0,-36,452,54,18,312,249,272,119,-23,-62,-3,1,7,-6,-1,-2,-3,0,1,1,0,3588,3589,3588,3589,3591,3595,3597,3603,3607,3611,3613,3616,11.472394551,12.132409546,12.420662638,12.808341998,13.1318395,13.043733146,12.477975795,13.145700557,11.565270257,11.791855458,5.7673722605,6.3125481139,5.9825685566,5.9370432319,5.7768182833,5.3054285379,5.8923774588,5.3039052141,5.3726194347,6.1069991276,5.7050222901,5.8198614319,6.4380940812,6.8712987659,7.3550212164,7.7383046078,6.5855983363,7.8417953434,6.1926508222,5.6848563307,2.930448608,5.481139338,0.3644204197,3.5260612088,4.9132732822,11.050533474,12.651281014,3.1367181374,8.7375758176,6.7261418963,-4.052748075,8.4372594303,1.2754714689,-2.983590254,4.3772798332,-3.751905264,-4.794777736,0.2566405749,-9.387945539,-8.47099879,-1.122299467,13.918398768,1.6398918886,0.5424709552,9.2905531155,7.2986282096,7.8565032784,3.3933587122,-0.650369721,-1.744856894 +050,2,4,46,013,South Dakota,Brown County,36531,36532,36655,36932,37578,38149,38278,38434,38884,39332,39103,38883,38738,123,277,646,571,129,156,450,448,-229,-220,-145,126,498,453,519,494,484,512,555,500,491,477,82,366,387,379,390,398,360,365,370,328,354,44,132,66,140,104,86,152,190,130,163,123,11,89,178,21,68,77,149,240,71,139,123,67,58,388,406,-38,-3,151,20,-431,-523,-391,78,147,566,427,30,74,300,260,-360,-384,-268,1,-2,14,4,-5,-4,-2,-2,1,1,0,1365,1365,1365,1365,1365,1365,1365,1365,1369,1370,1370,1369,13.534999388,12.159441686,13.707132199,12.9273686,12.618625508,13.244005277,14.191469776,12.74941034,12.592003693,12.290488399,9.9474091891,10.3878674,10.009639891,10.205817316,10.376473042,9.3121912103,9.3331287716,9.4345636514,8.4117662144,9.1212429626,3.5875901994,1.7715742853,3.6974923079,2.7215512842,2.2421524664,3.9318140666,4.8583410044,3.3148466883,4.1802374785,3.1692454362,2.4189055132,4.7778821635,0.5546238462,1.7794758397,2.0075086036,3.8542124732,6.136851795,1.8104162682,3.5647423897,3.1692454362,1.5763653906,10.414709435,10.722727693,-0.994412969,-0.078214621,3.9059468688,0.5114043163,-10.98999171,-13.41266381,-10.07459322,3.9952709038,15.192591598,11.277351539,0.7850628705,1.9292939827,7.7601593419,6.6482561113,-9.179575445,-9.847921422,-6.90534778 +050,2,4,46,015,South Dakota,Brule County,5255,5255,5282,5296,5292,5356,5277,5239,5202,5300,5185,5222,5254,27,14,-4,64,-79,-38,-37,98,-115,37,32,32,68,82,69,72,78,61,74,72,72,65,15,59,69,57,53,56,51,61,37,44,50,17,9,13,12,19,22,10,13,35,28,15,0,0,0,0,0,0,1,2,0,2,0,9,6,-17,52,-100,-60,-50,84,-151,8,18,9,6,-17,52,-100,-60,-49,86,-151,10,18,1,-1,0,0,2,0,2,-1,1,-1,-1,132,132,132,132,132,132,132,132,132,132,132,132,12.856872755,15.489233094,12.960180316,13.542744287,14.834537847,11.68470453,14.092553799,13.733905579,13.836840588,12.409316533,11.155227831,13.033622969,10.706235913,9.9689645443,10.650437429,9.7691791974,11.616834889,7.0577014783,8.455847026,9.5456281023,1.7016449234,2.4556101247,2.2539444027,3.5737797423,4.1841004184,1.9155253328,2.4757189107,6.6762041011,5.380993562,2.8636884307,0,0,0,0,0,0.1915525333,0.3808798324,0,0.384356683,0,1.134429949,-3.211182471,9.7670924117,-18.80936706,-11.41118296,-9.577626664,15.996952961,-28.80305198,1.537426732,3.4364261168,1.134429949,-3.211182471,9.7670924117,-18.80936706,-11.41118296,-9.386074131,16.377832794,-28.80305198,1.921783415,3.4364261168 +050,2,4,46,017,South Dakota,Buffalo County,1912,1913,1934,1979,2016,2025,2087,2099,2035,2014,2039,1982,1956,21,45,37,9,62,12,-64,-21,25,-57,-26,6,52,59,45,56,51,49,50,32,30,31,1,17,17,17,14,19,34,29,17,27,30,5,35,42,28,42,32,15,21,15,3,1,0,0,0,0,0,0,0,0,0,0,0,15,10,-4,-19,20,-21,-78,-42,12,-60,-28,15,10,-4,-19,20,-21,-78,-42,12,-60,-28,1,0,-1,0,0,1,-1,0,-2,0,1,3,3,3,3,3,3,3,3,3,3,3,3,26.57807309,29.536921151,22.271714922,27.237354086,24.36693741,23.705853895,24.697456162,15.790772267,14.921661278,15.744032504,8.6889854332,8.5106382979,8.4137589706,6.8093385214,9.0778786431,16.448959845,14.324524574,8.3888477671,13.42949515,15.236160488,17.889087657,21.026282854,13.857955951,20.428015564,15.289058767,7.2568940493,10.372931588,7.4019245004,1.4921661278,0.5078720163,0,0,0,0,0,0,0,0,0,0,5.1111679019,-2.002503129,-9.403612967,9.7276264591,-10.03344482,-37.73584906,-20.74586318,5.9215396003,-29.84332256,-14.22041646,5.1111679019,-2.002503129,-9.403612967,9.7276264591,-10.03344482,-37.73584906,-20.74586318,5.9215396003,-29.84332256,-14.22041646 +050,2,4,46,019,South Dakota,Butte County,10110,10112,10144,10312,10222,10288,10254,10219,10130,10128,10259,10418,10538,32,168,-90,66,-34,-35,-89,-2,131,159,120,30,131,126,127,141,120,110,135,138,138,135,14,102,128,102,96,105,107,106,109,116,117,16,29,-2,25,45,15,3,29,29,22,18,0,0,-1,-2,-2,0,-1,0,0,0,0,16,139,-86,43,-78,-49,-91,-29,101,137,103,16,139,-87,41,-80,-49,-92,-29,101,137,103,0,0,-1,0,1,-1,0,-2,1,0,-1,111,111,111,111,111,111,111,111,111,111,111,111,12.807978099,12.27232882,12.384202828,13.72797196,11.722756802,10.811342081,13.328067924,13.538038946,13.348164627,12.884138194,9.9726241689,12.467127691,9.9463676255,9.3467043131,10.257412201,10.516487297,10.465001481,10.693088733,11.220196353,11.166253102,2.8353539304,-0.19479887,2.4378352023,4.3812676468,1.4653446002,0.294854784,2.8630664429,2.8449502134,2.1279682739,1.7178850926,0,-0.097399435,-0.195026816,-0.194723007,0,-0.098284928,0,0,0,0,13.590144701,-8.376351417,4.193076548,-7.594197254,-4.786792361,-8.943928449,-2.863066443,9.9082748811,13.251438797,9.830120252,13.590144701,-8.473750852,3.9980497318,-7.788920261,-4.786792361,-9.042213377,-2.863066443,9.9082748811,13.251438797,9.830120252 +050,2,4,46,021,South Dakota,Campbell County,1466,1466,1471,1425,1406,1369,1402,1414,1387,1373,1377,1380,1380,5,-46,-19,-37,33,12,-27,-14,4,3,0,3,15,3,14,9,18,10,12,13,12,12,2,17,17,18,9,14,15,16,15,13,9,1,-2,-14,-4,0,4,-5,-4,-2,-1,3,0,0,3,0,1,1,3,1,0,1,1,4,-45,-8,-33,32,7,-26,-11,6,3,-4,4,-45,-5,-33,33,8,-23,-10,6,4,-3,0,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,10.359116022,2.1193924408,10.09009009,6.4958498737,12.784090909,7.1403070332,8.6956521739,9.4545454545,8.7051142546,8.6956521739,11.740331492,12.009890498,12.972972973,6.4958498737,9.9431818182,10.71046055,11.594202899,10.909090909,9.4305404425,6.5217391304,-1.38121547,-9.890498057,-2.882882883,0,2.8409090909,-3.570153517,-2.898550725,-1.454545455,-0.725426188,2.1739130435,0,2.1193924408,0,0.7217610971,0.7102272727,2.14209211,0.7246376812,0,0.7254261879,0.7246376812,-31.07734807,-5.651713176,-23.78378378,23.096355106,4.9715909091,-18.56479829,-7.971014493,4.3636363636,2.1762785637,-2.898550725,-31.07734807,-3.532320735,-23.78378378,23.818116204,5.6818181818,-16.42270618,-7.246376812,4.3636363636,2.9017047515,-2.173913043 +050,2,4,46,023,South Dakota,Charles Mix County,9129,9131,9153,9187,9192,9184,9238,9359,9363,9402,9309,9286,9262,22,34,5,-8,54,121,4,39,-93,-23,-24,34,146,167,156,150,182,165,153,157,154,147,11,109,93,79,93,116,133,107,108,92,112,23,37,74,77,57,66,32,46,49,62,35,0,0,2,0,0,0,-1,-1,-1,-1,0,0,-2,-72,-84,0,54,-27,-6,-141,-85,-59,0,-2,-70,-84,0,54,-28,-7,-142,-86,-59,-1,-1,1,-1,-3,1,0,0,0,1,0,589,589,589,589,589,589,589,589,589,589,589,589,15.921483097,18.17291474,16.978667828,16.284876778,19.573049417,17.626321974,16.306954436,16.781572337,16.563592364,15.850765581,11.886586696,10.120245933,8.5981715281,10.096623602,12.475130397,14.207883773,11.404209965,11.544011544,9.8951331003,12.076773776,4.0348964013,8.0526688068,8.3804962995,6.1882531756,7.0979190192,3.418438201,4.9027444711,5.2375607931,6.6684592632,3.773991805,0,0.2176396975,0,0,0,-0.106826194,-0.106581402,-0.106888996,-0.107555795,0,-0.218102508,-7.835029109,-9.142359599,0,5.8073882884,-2.884307232,-0.639488409,-15.0713484,-9.142242538,-6.3618719,-0.218102508,-7.617389412,-9.142359599,0,5.8073882884,-2.991133426,-0.746069811,-15.1782374,-9.249798333,-6.3618719 +050,2,4,46,025,South Dakota,Clark County,3691,3691,3698,3597,3596,3627,3651,3652,3634,3677,3721,3740,3802,7,-101,-1,31,24,1,-18,43,44,19,62,15,45,35,49,59,67,62,66,68,65,67,8,64,51,44,53,35,50,38,50,25,35,7,-19,-16,5,6,32,12,28,18,40,32,0,17,19,1,8,3,4,11,17,-1,4,0,-99,-3,24,10,-33,-34,5,11,-20,26,0,-82,16,25,18,-30,-30,16,28,-21,30,0,0,-1,1,0,-1,0,-1,-2,0,0,489,489,489,489,489,489,489,489,489,489,489,489,12.337217272,9.7316835813,13.567769625,16.213245397,18.348623853,17.018940434,18.054985638,18.383346851,17.42393781,17.767170512,17.546264565,14.180453218,12.183303337,14.56444078,9.5851020129,13.724951963,10.395294761,13.517166802,6.7015145423,9.28135773,-5.209047293,-4.448769637,1.3844662882,1.6488046167,8.7635218403,3.293988471,7.6596908768,4.8661800487,10.722423268,8.4858127818,4.660726525,5.2829139441,0.2768932576,2.1984061555,0.8215801725,1.097996157,3.009164273,4.5958367126,-0.268060582,1.0607265977,-27.141878,-0.834144307,6.6454381836,2.7480076944,-9.037381898,-9.332967335,1.3678019423,2.9737766964,-5.361211634,6.8947228852,-22.48115147,4.4487696371,6.9223314412,4.94641385,-8.215801725,-8.234971178,4.3769662153,7.569613409,-5.629272216,7.9554494829 +050,2,4,46,027,South Dakota,Clay County,13864,13866,13830,13993,14077,13914,13907,13798,13980,14075,13985,14096,14246,-36,163,84,-163,-7,-109,182,95,-90,111,150,29,157,143,159,165,128,155,150,138,127,130,35,89,99,111,81,111,109,103,115,77,88,-6,68,44,48,84,17,46,47,23,50,42,-2,13,50,-1,27,23,72,67,-1,40,27,-28,81,-8,-218,-120,-150,64,-19,-111,21,80,-30,94,42,-219,-93,-127,136,48,-112,61,107,0,1,-2,8,2,1,0,0,-1,0,1,2237,2237,2237,2237,2240,2243,2245,2247,2252,2254,2254,2255,11.285626999,10.18881368,11.360794541,11.861543438,9.2402093485,11.159910721,10.693281055,9.8360655738,9.0452619209,9.1736645261,6.3975847321,7.0537940862,7.9311207174,5.8229395061,8.0129940444,7.8479372165,7.3427196578,8.1967213115,5.4841351804,6.2098652177,4.8880422672,3.1350195939,3.4296738237,6.0386039323,1.2272153041,3.3119735042,3.3505613973,1.6393442623,3.5611267405,2.9637993084,0.9344786687,3.5625222658,-0.071451538,1.9409798354,1.6603501173,5.1839585283,4.7763322046,-0.071275837,2.8489013924,1.9052995554,5.8225209359,-0.570003563,-15.57643528,-8.626577046,-10.82837033,4.6079631363,-1.354482267,-7.911617962,1.495673231,5.6453320161,6.7569996046,2.9925187032,-15.64788682,-6.685597211,-9.168020213,9.7919216646,3.4218499376,-7.982893799,4.3445746234,7.5506315715 +050,2,4,46,029,South Dakota,Codington County,27227,27225,27212,27431,27629,27864,27958,27907,28069,28219,28098,28092,28186,-13,219,198,235,94,-51,162,150,-121,-6,94,93,369,380,367,423,367,372,368,324,313,309,71,241,259,210,262,235,243,253,229,248,265,22,128,121,157,161,132,129,115,95,65,44,3,20,38,1,7,14,38,117,17,62,49,-37,72,43,82,-70,-197,-4,-83,-234,-134,0,-34,92,81,83,-63,-183,34,34,-217,-72,49,-1,-1,-4,-5,-4,0,-1,1,1,1,1,381,381,381,381,381,381,381,381,381,381,381,381,13.505847044,13.803123865,13.226893482,15.155315109,13.13881679,13.291410605,13.075611143,11.506294725,11.140772379,10.981200469,8.8208919715,9.4079186342,7.5685221559,9.3869800437,8.4131388168,8.682292411,8.9894826606,8.1325354689,8.8271934508,9.4175343829,4.684955072,4.3952052307,5.6583713261,5.768335065,4.7256779737,4.6091181935,4.0861284821,3.3737592556,2.3135789286,1.5636660862,0.73202423,1.3803123865,0.0360405817,0.2507971767,0.5012082699,1.3577247392,4.1571915861,0.6037253405,2.2067983627,1.7413554142,2.635287228,1.5619324373,2.955327699,-2.507971767,-7.05271637,-0.142918394,-2.949118818,-8.310101745,-4.769531945,0,3.367311458,2.9422448238,2.9913682807,-2.257174591,-6.5515081,1.2148063456,1.2080727686,-7.706376405,-2.562733582,1.7413554142 +050,2,4,46,031,South Dakota,Corson County,4050,4040,4064,4034,4067,4206,4170,4172,4098,4187,4137,4076,4031,24,-30,33,139,-36,2,-74,89,-50,-61,-45,20,79,82,88,94,90,81,108,88,107,91,15,50,41,46,51,35,56,50,52,35,66,5,29,41,42,43,55,25,58,36,72,25,0,0,3,0,1,2,1,0,0,0,0,18,-60,-9,93,-82,-57,-100,32,-86,-132,-70,18,-60,-6,93,-81,-55,-99,32,-86,-132,-70,1,1,-2,4,2,2,0,-1,0,-1,0,1,1,1,1,1,1,1,1,1,1,1,1,19.510990368,20.24441427,21.274023933,22.445081184,21.577559338,19.588875453,26.071213036,21.143680923,26.056252283,22.449734797,12.348728081,10.122207135,11.120512511,12.17765043,8.391273076,13.542926239,12.070006035,12.493993272,8.5230731767,16.282225237,7.162262287,10.122207135,10.153511423,10.267430755,13.186286262,6.045949214,14.001207001,8.6496876502,17.533179106,6.1675095596,0,0.7406493026,0,0.2387774594,0.4795013186,0.2418379686,0,0,0,0,-14.8184737,-2.221947908,22.482775293,-19.57975167,-13.66578758,-24.18379686,7.7248038624,-20.66314272,-32.14416169,-17.26902677,-14.8184737,-1.481298605,22.482775293,-19.34097421,-13.18628626,-23.94195889,7.7248038624,-20.66314272,-32.14416169,-17.26902677 +050,2,4,46,033,South Dakota,Custer County,8216,8219,8275,8346,8316,8408,8435,8456,8614,8747,8821,8929,9017,56,71,-30,92,27,21,158,133,74,108,88,24,80,69,68,70,73,70,81,72,69,69,11,87,90,85,64,92,113,100,83,109,94,13,-7,-21,-17,6,-19,-43,-19,-11,-40,-25,0,0,0,1,2,3,8,70,2,7,6,40,78,-8,105,21,36,191,83,84,142,109,40,78,-8,106,23,39,199,153,86,149,115,3,0,-1,3,-2,1,2,-1,-1,-1,-2,255,255,255,252,255,255,249,253,252,251,252,252,9.626376271,8.2823190493,8.1320258311,8.3120584219,8.6436563851,8.20152314,9.3312597201,8.1967213115,7.7746478873,7.6897358743,10.468684195,10.803024847,10.165032289,7.5995962714,10.89337517,13.23960164,11.520073728,9.4489981785,12.281690141,10.475872061,-0.842307924,-2.520705798,-2.033006458,0.7124621504,-2.249718785,-5.0380785,-2.188814008,-1.252276867,-4.507042254,-2.786136186,0,0,0.1195886152,0.2374873835,0.3552187556,0.9373169303,8.0640516099,0.2276867031,0.7887323944,0.6686726847,9.3857168642,-0.960268875,12.556804592,2.4936175266,4.2626250666,22.378441711,9.5616611946,9.5628415301,16,12.147553772,9.3857168642,-0.960268875,12.676393207,2.7311049101,4.6178438222,23.315758641,17.625712805,9.7905282332,16.788732394,12.816226457 +050,2,4,46,035,South Dakota,Davison County,19504,19504,19484,19723,19958,19950,19974,19922,20034,19893,19847,19865,19812,-20,239,235,-8,24,-52,112,-141,-46,18,-53,62,245,264,271,270,240,260,247,251,246,260,76,176,223,200,193,242,218,214,229,227,205,-14,69,41,71,77,-2,42,33,22,19,55,-2,165,81,-5,-7,-5,9,13,-3,8,5,-3,7,113,-71,-44,-44,61,-187,-66,-9,-113,-5,172,194,-76,-51,-49,70,-174,-69,-1,-108,-1,-2,0,-3,-2,-1,0,0,1,0,0,769,769,769,769,769,769,769,769,770,771,771,771,12.497768256,13.306116277,13.581236845,13.525698828,12.031281331,13.014315747,12.372579958,12.632108707,12.389202256,13.105829574,8.9779886245,11.239636098,10.023053022,9.6683699028,12.131542009,10.912003204,10.719563203,11.524911928,11.432312651,10.333442549,3.5197796312,2.0664801794,3.5581838228,3.857328925,-0.100260678,2.1023125438,1.6530167556,1.1071967791,0.9568896052,2.7723870252,8.4168643355,4.0825584033,-0.250576326,-0.350666266,-0.250651694,0.4504955451,0.6511884189,-0.150981379,0.4029008864,0.2520351841,0.357079093,5.6954209823,-3.558183823,-2.204187957,-2.205734911,3.0533586946,-9.367094948,-3.321590337,-0.453263497,-5.695995161,8.7739434285,9.7779793856,-3.808760148,-2.554854223,-2.456386605,3.5038542397,-8.715906529,-3.472571716,-0.050362611,-5.443959977 +050,2,4,46,037,South Dakota,Day County,5710,5710,5710,5743,5600,5583,5510,5504,5515,5498,5487,5414,5345,0,33,-143,-17,-73,-6,11,-17,-11,-73,-69,18,73,60,63,53,68,59,51,68,63,61,30,66,78,82,67,70,61,91,88,66,81,-12,7,-18,-19,-14,-2,-2,-40,-20,-3,-20,1,3,6,1,3,2,2,1,0,1,1,11,23,-133,2,-63,-5,11,24,9,-71,-49,12,26,-127,3,-60,-3,13,25,9,-70,-48,0,0,2,-1,1,-1,0,-2,0,0,-1,139,139,139,139,139,139,139,139,139,139,139,139,12.747751681,10.579211849,11.267101851,9.5555755882,12.347920828,10.708775751,9.2617815309,12.380518889,11.558572608,11.339343805,11.525364533,13.752975403,14.665116695,12.079689895,12.71109497,11.071785098,16.525923908,16.021847975,12.108980827,15.057161446,1.2223871475,-3.173763555,-3.398014844,-2.524114306,-0.363174142,-0.363009347,-7.264142377,-3.641329085,-0.550408219,-3.717817641,0.5238802061,1.0579211849,0.1788428865,0.5408816371,0.363174142,0.3630093475,0.1816035594,0,0.1834694065,0.1858908821,4.0164149131,-23.45058626,0.357685773,-11.35851438,-0.907935355,1.9965514112,4.3584854263,1.6385980883,-13.02632786,-9.108653221,4.5402951192,-22.39266508,0.5365286596,-10.81763274,-0.544761213,2.3595607587,4.5400889857,1.6385980883,-12.84285845,-8.922762339 +050,2,4,46,039,South Dakota,Deuel County,4364,4364,4350,4368,4376,4312,4323,4326,4244,4302,4317,4334,4346,-14,18,8,-64,11,3,-82,58,15,17,12,12,50,38,52,53,46,46,60,52,54,56,15,38,49,34,39,48,46,50,55,31,41,-3,12,-11,18,14,-2,0,10,-3,23,15,0,19,11,0,3,2,2,25,0,4,3,-11,-13,8,-84,-5,3,-84,24,18,-10,-5,-11,6,19,-84,-2,5,-82,49,18,-6,-2,0,0,0,2,-1,0,0,-1,0,0,-1,50,50,50,50,50,50,50,50,50,50,50,50,11.470520762,8.6916742909,11.97053407,12.275622467,10.637067869,10.73512252,14.041656916,12.066365008,12.484105884,12.903225806,8.7175957788,11.20768527,7.8268876611,9.0330052113,11.099549081,10.73512252,11.701380763,12.76250145,7.1668015258,9.4470046083,2.7529249828,-2.516010979,4.1436464088,3.2426172554,-0.462481212,0,2.3402761526,-0.696136443,5.3173043579,3.4562211982,4.3587978894,2.516010979,0,0.6948465547,0.4624812117,0.4667444574,5.8506903815,0,0.924748584,0.6912442396,-2.982335398,1.8298261665,-19.33701657,-1.158077591,0.6937218176,-19.60326721,5.6166627662,4.1768186565,-2.31187146,-1.152073733,1.3764624914,4.3458371455,-19.33701657,-0.463231036,1.1562030293,-19.13652275,11.467353148,4.1768186565,-1.387122876,-0.460829493 +050,2,4,46,041,South Dakota,Dewey County,5301,5301,5325,5396,5532,5584,5666,5702,5787,5854,5904,5872,5789,24,71,136,52,82,36,85,67,50,-32,-83,32,114,152,140,158,150,160,147,149,133,127,18,52,50,83,61,67,59,62,64,57,76,14,62,102,57,97,83,101,85,85,76,51,0,1,0,0,0,0,0,0,0,0,0,11,9,32,-4,-15,-46,-15,-18,-37,-108,-134,11,10,32,-4,-15,-46,-15,-18,-37,-108,-134,-1,-1,2,-1,0,-1,-1,0,2,0,0,19,19,19,19,19,19,19,19,19,19,19,19,21.266672885,27.818448023,25.188916877,28.088888889,26.389866291,27.852728697,25.255562237,25.344446334,22.588315217,21.782008404,9.7005876318,9.1508052709,14.933429291,10.844444444,11.78747361,10.270693707,10.652005841,10.886205137,9.6807065217,13.034902667,11.566085253,18.667642753,10.255487585,17.244444444,14.602392681,17.58203499,14.603556395,14.458241197,12.907608696,8.7471057371,0.1865497621,0,0,0,0,0,0,0,0,0,1.6789478593,5.8565153734,-0.719683339,-2.666666667,-8.092892329,-2.611193315,-3.092517825,-6.293587345,-18.3423913,-22.98259154,1.8654976215,5.8565153734,-0.719683339,-2.666666667,-8.092892329,-2.611193315,-3.092517825,-6.293587345,-18.3423913,-22.98259154 +050,2,4,46,043,South Dakota,Douglas County,3002,2997,2991,2970,2944,2969,2924,2947,2911,2914,2919,2911,2906,-6,-21,-26,25,-45,23,-36,3,5,-8,-5,5,37,30,33,39,44,44,38,58,37,43,6,55,49,34,47,48,38,44,37,37,35,-1,-18,-19,-1,-8,-4,6,-6,21,0,8,1,1,0,1,2,7,12,10,2,8,6,-7,-3,-7,27,-41,21,-54,0,-18,-16,-18,-6,-2,-7,28,-39,28,-42,10,-16,-8,-12,1,-1,0,-2,2,-1,0,-1,0,0,-1,178,178,178,178,178,178,178,178,178,178,178,178,12.414024493,10.145417653,11.161846778,13.236042763,14.988928632,15.022191874,13.0472103,19.886850677,12.69296741,14.784253051,18.453279651,16.570848833,11.500084559,15.951128457,16.351558508,12.973711164,15.107296137,12.686439225,12.69296741,12.033694344,-6.039255159,-6.42543118,-0.338237781,-2.715085695,-1.362629876,2.0484807101,-2.060085837,7.2004114521,0,2.7505587072,0.3355141755,0,0.3382377812,0.6787714237,2.3846022824,4.0969614203,3.4334763948,0.6857534716,2.7444253859,2.0629190304,-1.006542526,-2.367264119,9.1324200913,-13.91481419,7.1538068472,-18.43632639,0,-6.171781245,-5.488850772,-6.188757091,-0.671028351,-2.367264119,9.4706578725,-13.23604276,9.5384091296,-14.33936497,3.4334763948,-5.486027773,-2.744425386,-4.125838061 +050,2,4,46,045,South Dakota,Edmunds County,4071,4071,4066,4042,4013,4026,3972,3998,3937,3915,3853,3857,3817,-5,-24,-29,13,-54,26,-61,-22,-62,4,-40,11,34,44,55,45,51,41,49,33,45,39,18,47,53,59,30,39,42,52,42,29,34,-7,-13,-9,-4,15,12,-1,-3,-9,16,5,0,0,0,1,4,7,12,9,2,5,5,2,-10,-19,17,-75,7,-72,-27,-56,-16,-49,2,-10,-19,18,-71,14,-60,-18,-54,-11,-44,0,-1,-1,-1,2,0,0,-1,1,-1,-1,420,420,420,420,420,420,420,420,420,420,420,420,8.3867784904,10.924891372,13.683293942,11.252813203,12.797992472,10.333963453,12.480896587,8.4963954686,11.673151751,10.164190774,11.593487913,13.159528243,14.678442592,7.5018754689,9.7867001255,10.586011342,13.245033113,10.813594233,7.5226977951,8.8610893928,-3.206709423,-2.234636872,-0.99514865,3.7509377344,3.0112923463,-0.252047889,-0.764136526,-2.317198764,4.1504539559,1.3031013813,0,0,0.2487871626,1.0002500625,1.756587202,3.0245746692,2.2924095772,0.5149330587,1.2970168612,1.3031013813,-2.466699556,-4.717566729,4.2293817639,-18.75468867,1.756587202,-18.14744802,-6.877228732,-14.41812564,-4.150453956,-12.77039354,-2.466699556,-4.717566729,4.4781689265,-17.75443861,3.513174404,-15.12287335,-4.584819154,-13.90319258,-2.853437095,-11.46729216 +050,2,4,46,047,South Dakota,Fall River County,7094,7094,7115,6960,6974,6811,6849,6809,6779,6698,6730,6688,6708,21,-155,14,-163,38,-40,-30,-81,32,-42,20,8,51,53,69,52,75,56,55,49,48,46,13,117,115,117,127,125,117,124,110,116,105,-5,-66,-62,-48,-75,-50,-61,-69,-61,-68,-59,1,2,1,0,1,7,11,11,2,8,7,25,-91,73,-117,112,4,19,-22,90,19,73,26,-89,74,-117,113,11,30,-11,92,27,80,0,0,2,2,0,-1,1,-1,1,-1,-1,235,235,207,204,196,232,205,195,221,218,197,199,7.2468916519,7.6072915172,10.010881393,7.6134699854,10.982574315,8.2425669709,8.1620538696,7.2981829014,7.1545684901,6.867721708,16.625222025,16.506387254,16.974972797,18.59443631,18.304290526,17.221077421,18.401721451,16.383675901,17.290207184,15.67632129,-9.378330373,-8.899095737,-6.964091404,-10.98096633,-7.32171621,-8.97851045,-10.23966758,-9.085493,-10.13563869,-8.808599582,0.2841918295,0.1435338022,0,0.1464128843,1.0250402694,1.619075655,1.6324107739,0.2978850164,1.1924280817,1.045088086,-12.93072824,10.477967561,-16.9749728,16.398243045,0.5857372968,2.7965852223,-3.264821548,13.404825737,2.832016694,10.898775754,-12.64653641,10.621501364,-16.9749728,16.54465593,1.6107775663,4.4156608772,-1.632410774,13.702710754,4.0244447757,11.94386384 +050,2,4,46,049,South Dakota,Faulk County,2364,2364,2368,2355,2355,2350,2321,2310,2318,2324,2320,2307,2306,4,-13,0,-5,-29,-11,8,6,-4,-13,-1,5,29,23,31,29,32,30,39,33,34,31,5,26,26,23,35,36,38,26,29,27,19,0,3,-3,8,-6,-4,-8,13,4,7,12,0,-1,-1,-1,0,1,1,0,0,0,0,3,-15,4,-11,-23,-8,16,-7,-8,-20,-12,3,-16,3,-12,-23,-7,17,-7,-8,-20,-12,1,0,0,-1,0,0,-1,0,0,0,-1,497,497,497,497,497,497,497,497,497,497,497,497,12.280330299,9.7664543524,13.177470776,12.417041319,13.819909307,12.964563526,16.803102111,14.211886305,14.696347525,13.440277477,11.009951302,11.040339703,9.7768331562,14.98608435,15.54739797,16.421780467,11.202068074,12.489233419,11.670628917,8.2375894212,1.2703789964,-1.27388535,3.4006376196,-2.569043031,-1.727488663,-3.45721694,5.6010340371,1.7226528854,3.0257186082,5.2026880555,-0.423459665,-0.42462845,-0.425079702,0,0.4318721658,0.4321521175,0,0,0,0,-6.351894982,1.6985138004,-4.675876727,-9.847998287,-3.454977327,6.9144338807,-3.015941405,-3.445305771,-8.644910309,-5.202688055,-6.775354647,1.2738853503,-5.100956429,-9.847998287,-3.023105161,7.3465859983,-3.015941405,-3.445305771,-8.644910309,-5.202688055 +050,2,4,46,051,South Dakota,Grant County,7356,7358,7351,7358,7401,7390,7315,7221,7223,7179,7123,7102,7000,-7,7,43,-11,-75,-94,2,-44,-56,-21,-102,23,72,72,89,79,92,80,77,92,75,76,22,73,72,90,92,82,94,90,90,76,87,1,-1,0,-1,-13,10,-14,-13,2,-1,-11,-1,113,75,4,1,-2,4,16,1,10,7,-8,-106,-32,-13,-66,-104,13,-46,-60,-31,-97,-9,7,43,-9,-65,-106,17,-30,-59,-21,-90,1,1,0,-1,3,2,-1,-1,1,1,-1,104,104,104,104,104,104,104,104,104,104,104,104,9.789924536,9.756758588,12.03434521,10.744644679,12.658227848,11.077263916,10.692959311,12.86533352,10.544815466,10.778612963,9.9258957101,9.756758588,12.169562572,12.512750765,11.282333517,13.015785101,12.49826413,12.585652356,10.685413005,12.338675365,-0.135971174,0,-0.135217362,-1.768106086,1.3758943313,-1.938521185,-1.805304819,0.2796811635,-0.14059754,-1.560062402,15.364742675,10.163290196,0.5408694476,0.1360081605,-0.275178866,0.5538631958,2.2219136231,0.1398405817,1.4059753954,0.9927669834,-14.41294446,-4.33633715,-1.757825705,-8.976538592,-14.30930105,1.8000553863,-6.388001666,-8.390434904,-4.358523726,-13.75691391,0.9517982188,5.8269530456,-1.216956257,-8.840530432,-14.58447991,2.3539185821,-4.166088043,-8.250594322,-2.95254833,-12.76414693 +050,2,4,46,053,South Dakota,Gregory County,4271,4271,4270,4223,4247,4234,4227,4195,4157,4207,4197,4183,4219,-1,-47,24,-13,-7,-32,-38,50,-10,-14,36,13,55,36,47,51,56,50,57,57,44,49,14,69,62,66,70,70,60,54,52,56,56,-1,-14,-26,-19,-19,-14,-10,3,5,-12,-7,0,-1,0,0,0,0,0,0,0,0,0,0,-31,49,8,13,-17,-28,46,-14,-2,43,0,-32,49,8,13,-17,-28,46,-14,-2,43,0,-1,1,-2,-1,-1,0,1,-1,0,0,44,44,44,44,44,44,44,44,44,44,44,44,12.951842694,8.5005903188,11.083598632,12.055312611,13.298503918,11.973180077,13.629842181,13.564969062,10.501193317,11.66388955,16.24867538,14.639905549,15.564202335,16.546507505,16.623129898,14.367816092,12.912482066,12.375059495,13.365155131,13.330159486,-3.296832686,-6.13931523,-4.480603702,-4.491194894,-3.32462598,-2.394636015,0.7173601148,1.1899095669,-2.863961814,-1.666269936,-0.235488049,0,0,0,0,0,0,0,0,0,-7.300129518,11.570247934,1.88656998,3.0729228224,-4.037045832,-6.704980843,10.99952176,-3.331746787,-0.477326969,10.235658177,-7.535617567,11.570247934,1.88656998,3.0729228224,-4.037045832,-6.704980843,10.99952176,-3.331746787,-0.477326969,10.235658177 +050,2,4,46,055,South Dakota,Haakon County,1937,1937,1930,1918,1922,1880,1845,1849,1884,1919,1888,1866,1861,-7,-12,4,-42,-35,4,35,35,-31,-22,-5,7,21,20,18,19,23,23,17,26,16,17,4,25,22,33,32,27,18,28,29,21,13,3,-4,-2,-15,-13,-4,5,-11,-3,-5,4,0,0,0,0,0,0,0,0,0,0,0,-11,-8,6,-27,-23,8,30,47,-27,-17,-8,-11,-8,6,-27,-23,8,30,47,-27,-17,-8,1,0,0,0,1,0,0,-1,-1,0,-1,36,36,36,36,36,36,36,36,36,36,36,36,10.914760915,10.416666667,9.4687006839,10.201342282,12.45262588,12.322528797,8.9403102814,13.65904912,8.5242408098,9.1226187282,12.993762994,11.458333333,17.359284587,17.181208054,14.618299946,9.6437181891,14.725216934,15.235093249,11.188066063,6.9761202039,-2.079002079,-1.041666667,-7.890583903,-6.979865772,-2.165674066,2.6788106081,-5.784906653,-1.576044129,-2.663825253,2.1464985243,0,0,0,0,0,0,0,0,0,0,-4.158004158,3.125,-14.20305103,-12.34899329,4.3313481321,16.072863649,24.717328425,-14.18439716,-9.05700586,-4.292997049,-4.158004158,3.125,-14.20305103,-12.34899329,4.3313481321,16.072863649,24.717328425,-14.18439716,-9.05700586,-4.292997049 +050,2,4,46,057,South Dakota,Hamlin County,5903,5899,5915,5964,5946,5927,5952,5977,5916,6032,6113,6224,6234,16,49,-18,-19,25,25,-61,116,81,111,10,29,112,115,114,126,120,109,123,113,129,131,19,79,75,75,59,64,65,67,53,63,61,10,33,40,39,67,56,44,56,60,66,70,0,40,23,1,0,1,5,35,3,8,7,7,-25,-82,-61,-42,-31,-110,25,18,38,-68,7,15,-59,-60,-42,-30,-105,60,21,46,-61,-1,1,1,2,0,-1,0,0,0,-1,1,245,245,245,245,245,245,245,245,245,245,245,245,18.856806128,19.311502939,19.203234229,21.213906895,20.119037639,18.330110149,20.589219953,18.608480856,20.912701629,21.030663028,13.300782894,12.594458438,12.63370673,9.9334960855,10.730153408,10.93079963,11.215266153,8.7278715521,10.213179865,9.792904158,5.5560232343,6.7170445004,6.5695274994,11.280410809,9.3888842317,7.3993105188,9.3739537998,9.8806093042,10.699521764,11.23775887,6.7345736173,3.8623005877,0.1684494231,0,0.167658647,0.8408307408,5.8587211249,0.4940304652,1.2969117289,1.123775887,-4.209108511,-13.76994123,-10.27541481,-7.071302298,-5.197418057,-18.4982763,4.1848008035,2.9641827913,6.1603307125,-10.91668004,2.5254651065,-9.907640638,-10.10696538,-7.071302298,-5.02975941,-17.65744556,10.043521928,3.4582132565,7.4572424414,-9.792904158 +050,2,4,46,059,South Dakota,Hand County,3431,3430,3434,3435,3377,3375,3340,3305,3275,3273,3234,3170,3127,4,1,-58,-2,-35,-35,-30,-2,-39,-64,-43,12,45,31,33,39,30,31,45,39,31,30,15,48,38,50,42,43,56,42,45,36,27,-3,-3,-7,-17,-3,-13,-25,3,-6,-5,3,0,5,2,0,0,0,0,0,0,0,0,7,-2,-56,15,-33,-22,-5,-4,-32,-60,-46,7,3,-54,15,-33,-22,-5,-4,-32,-60,-46,0,1,3,0,1,0,0,-1,-1,1,0,61,61,61,61,61,61,61,61,61,61,61,61,13.102343864,9.1015854375,9.7748815166,11.615785555,9.0293453725,9.4224924012,13.744654856,11.987090825,9.6814490943,9.5283468318,13.975833455,11.156782149,14.81042654,12.50930752,12.942061701,17.021276596,12.828344533,13.831258645,11.242973142,8.5755121486,-0.873489591,-2.055196712,-5.035545024,-0.893521966,-3.912716328,-7.598784195,0.9163103238,-1.844167819,-1.561524047,0.9528346832,1.4558159849,0.5871990605,0,0,0,0,0,0,0,0,-0.582326394,-16.44157369,4.4431279621,-9.828741623,-6.62151994,-1.519756839,-1.221747098,-9.835561703,-18.73828857,-14.61013181,0.8734895909,-15.85437463,4.4431279621,-9.828741623,-6.62151994,-1.519756839,-1.221747098,-9.835561703,-18.73828857,-14.61013181 +050,2,4,46,061,South Dakota,Hanson County,3331,3332,3331,3375,3381,3403,3422,3388,3385,3411,3369,3463,3489,-1,44,6,22,19,-34,-3,26,-42,94,26,8,51,45,49,62,37,37,45,39,38,44,11,20,19,15,26,33,18,25,31,11,13,-3,31,26,34,36,4,19,20,8,27,31,0,0,0,-1,-1,0,0,0,0,0,0,3,12,-22,-9,-16,-38,-21,6,-50,66,-5,3,12,-22,-10,-17,-38,-21,6,-50,66,-5,-1,1,2,-2,0,0,-1,0,0,1,0,520,520,520,520,520,520,520,520,520,520,520,520,15.210259469,13.321492007,14.445754717,18.168498168,10.866372981,10.925734534,13.243084167,11.504424779,11.12412178,12.658227848,5.964807635,5.6246299586,4.4221698113,7.619047619,9.6916299559,5.3152222058,7.3572689818,9.1445427729,3.2201405152,3.7399309551,9.2454518342,7.6968620485,10.023584906,10.549450549,1.174743025,5.6105123284,5.8858151854,2.3598820059,7.9039812646,8.918296893,0,0,-0.294811321,-0.293040293,0,0,0,0,0,0,3.578884581,-6.512729426,-2.653301887,-4.688644689,-11.16005874,-6.201092573,1.7657445556,-14.74926254,19.320843091,-1.438434983,3.578884581,-6.512729426,-2.948113208,-4.981684982,-11.16005874,-6.201092573,1.7657445556,-14.74926254,19.320843091,-1.438434983 +050,2,4,46,063,South Dakota,Harding County,1255,1255,1246,1275,1304,1259,1245,1269,1266,1243,1252,1307,1311,-9,29,29,-45,-14,24,-3,-23,9,55,4,3,14,10,18,18,22,17,15,14,18,16,4,15,8,6,7,7,5,10,8,4,7,-1,-1,2,12,11,15,12,5,6,14,9,1,5,6,0,0,2,2,2,0,0,0,-10,24,21,-59,-26,8,-20,-29,3,40,-4,-9,29,27,-59,-26,10,-18,-27,3,40,-4,1,1,0,2,1,-1,3,-1,0,1,-1,29,29,29,29,29,29,29,29,29,29,29,29,11.106703689,7.7549437767,14.046039797,14.376996805,17.501988862,13.412228797,11.956954962,11.22244489,14.067995311,12.223071047,11.900039667,6.2039550213,4.6820132657,5.5910543131,5.568814638,3.9447731755,7.9713033081,6.4128256513,3.1262211801,5.3475935829,-0.793335978,1.5509887553,9.3640265314,8.785942492,11.933174224,9.4674556213,3.985651654,4.8096192385,10.941774131,6.8754774637,3.9666798889,4.652966266,0,0,1.5910898966,1.5779092702,1.5942606616,0,0,0,19.040063467,16.285381931,-46.03979711,-20.76677316,6.3643595863,-15.7790927,-23.11677959,2.4048096192,31.262211801,-3.055767762,23.006743356,20.938348197,-46.03979711,-20.76677316,7.9554494829,-14.20118343,-21.52251893,2.4048096192,31.262211801,-3.055767762 +050,2,4,46,065,South Dakota,Hughes County,17022,17022,17077,17317,17445,17444,17647,17579,17615,17697,17663,17487,17336,55,240,128,-1,203,-68,36,82,-34,-176,-151,53,248,228,239,254,232,228,230,232,243,224,22,138,147,131,126,140,146,170,158,173,195,31,110,81,108,128,92,82,60,74,70,29,0,2,-7,-3,-5,2,6,5,-1,4,3,23,128,54,-108,84,-162,-51,18,-108,-250,-182,23,130,47,-111,79,-160,-45,23,-109,-246,-179,1,0,0,2,-4,0,-1,-1,1,0,-1,772,772,772,772,771,772,770,771,771,770,768,770,14.421119963,13.11777228,13.70059331,14.476646434,13.172088798,12.956753992,13.026733122,13.122171946,13.826458037,12.865060449,8.0246554632,8.4575110753,7.5095302244,7.1813285458,7.9486742747,8.2968687845,9.6284549162,8.9366515837,9.8435277383,11.199494587,6.3964644996,4.6602612048,6.1910630858,7.2953178878,5.2234145234,4.6598852077,3.3982782057,4.185520362,3.9829302987,1.6655658616,0.1162993545,-0.402738623,-0.171973975,-0.284973355,0.1135524896,0.3409672103,0.2831898505,-0.056561086,0.2275960171,0.1722999167,7.4431586905,3.1068408032,-6.191063086,4.7875523639,-9.197751661,-2.898221288,1.0194834617,-6.108597285,-14.22475107,-10.45286161,7.559458045,2.7041021805,-6.36303706,4.5025790089,-9.084199171,-2.557254077,1.3026733122,-6.165158371,-13.99715505,-10.2805617 +050,2,4,46,067,South Dakota,Hutchinson County,7343,7346,7339,7249,7257,7192,7229,7270,7331,7347,7292,7287,7282,-7,-90,8,-65,37,41,61,16,-55,-5,-5,24,67,96,82,105,113,124,119,107,119,112,39,112,102,113,108,119,119,115,106,101,97,-15,-45,-6,-31,-3,-6,5,4,1,18,15,0,1,6,1,5,6,1,18,7,-1,1,8,-47,9,-34,35,42,55,-5,-63,-20,-21,8,-46,15,-33,40,48,56,13,-56,-21,-20,0,1,-1,-1,0,-1,0,-1,0,-2,0,832,832,832,832,832,832,832,832,832,832,832,832,9.1856320263,13.235902385,11.350266454,14.562096942,15.587281882,16.985138004,16.214743153,14.618484869,16.324850813,15.375111538,15.355086372,14.063146284,15.641220846,14.978156855,16.414925167,16.300253407,15.66970977,14.481863515,13.855545648,13.315944814,-6.169454346,-0.827243899,-4.290954391,-0.416059913,-0.827643286,0.6848845969,0.5450333833,0.1366213539,2.469305165,2.0591667239,0.1370989855,0.8272438991,0.1384178836,0.6934331877,0.8276432857,0.1369769194,2.4526502248,0.9563494774,-0.13718362,0.1372777816,-6.443652317,1.2408658486,-4.706208042,4.854032314,5.7935030002,7.5337305664,-0.681291729,-8.607145297,-2.743672406,-2.882833413,-6.306553332,2.0681097477,-4.567790158,5.5474655017,6.621146286,7.6707074858,1.7713584957,-7.650795819,-2.880856026,-2.745555632 +050,2,4,46,069,South Dakota,Hyde County,1420,1420,1422,1399,1429,1379,1393,1387,1330,1299,1265,1295,1281,2,-23,30,-50,14,-6,-57,-31,-34,30,-14,3,13,15,10,18,18,15,19,15,18,16,2,19,16,23,13,20,24,27,23,14,15,1,-6,-1,-13,5,-2,-9,-8,-8,4,1,0,0,1,0,0,0,0,0,0,0,0,1,-18,31,-39,9,-3,-48,-25,-26,27,-15,1,-18,32,-39,9,-3,-48,-25,-26,27,-15,0,1,-1,2,0,-1,0,2,0,-1,0,38,38,38,38,38,38,38,38,38,38,38,38,9.2165898618,10.608203678,7.1225071225,12.987012987,12.949640288,11.041589989,14.454165082,11.700468019,14.0625,12.422360248,13.470400567,11.315417256,16.381766382,9.3795093795,14.388489209,17.666543982,20.540129327,17.940717629,10.9375,11.645962733,-4.253810705,-0.707213579,-9.259259259,3.6075036075,-1.438848921,-6.624953993,-6.085964245,-6.24024961,3.125,0.7763975155,0,0.7072135785,0,0,0,0,0,0,0,0,-12.76143212,21.923620934,-27.77777778,6.4935064935,-2.158273381,-35.33308796,-19.01863827,-20.28081123,21.09375,-11.64596273,-12.76143212,22.630834512,-27.77777778,6.4935064935,-2.158273381,-35.33308796,-19.01863827,-20.28081123,21.09375,-11.64596273 +050,2,4,46,071,South Dakota,Jackson County,3031,3030,3049,3158,3174,3236,3273,3281,3271,3277,3277,3335,3321,19,109,16,62,37,8,-10,6,0,58,-14,17,72,75,71,75,72,61,94,84,69,69,2,29,41,29,33,45,35,36,38,19,18,15,43,34,42,42,27,26,58,46,50,51,0,2,7,1,4,0,1,2,0,2,1,3,64,-23,21,-11,-19,-37,-55,-46,7,-66,3,66,-16,22,-7,-19,-36,-53,-46,9,-65,1,0,-2,-2,2,0,0,1,0,-1,0,42,42,42,42,42,42,42,42,42,42,42,42,23.19961334,23.689197726,22.152886115,23.045014595,21.971315227,18.62026862,28.711056811,25.633201099,20.871143376,20.733173077,9.3442887063,12.950094757,9.0483619345,10.139806422,13.732072017,10.683760684,10.995723885,11.595971926,5.7471264368,5.4086538462,13.855324633,10.739102969,13.104524181,12.905208173,8.2392432103,7.9365079365,17.715332926,14.037229173,15.124016939,15.324519231,0.6444337039,2.2109917877,0.3120124805,1.2290674451,0,0.3052503053,0.6108735492,0,0.6049606776,0.3004807692,20.621878524,-7.264687303,6.5522620905,-3.379935474,-5.797985963,-11.29426129,-16.7990226,-14.03722917,2.1173623714,-19.83173077,21.266312228,-5.053695515,6.864274571,-2.150868029,-5.797985963,-10.98901099,-16.18814905,-14.03722917,2.722323049,-19.53125 +050,2,4,46,073,South Dakota,Jerauld County,2071,2071,2091,2075,2056,2073,2042,2021,2007,2020,2017,2014,1985,20,-16,-19,17,-31,-21,-14,13,-3,-3,-29,7,25,24,24,33,21,18,19,18,23,25,4,30,26,35,21,32,18,33,33,22,26,3,-5,-2,-11,12,-11,0,-14,-15,1,-1,0,0,3,2,3,5,6,6,1,4,4,16,-9,-21,26,-48,-15,-18,20,11,-8,-31,16,-9,-18,28,-45,-10,-12,26,12,-4,-27,1,-2,1,0,2,0,-2,1,0,0,-1,176,176,176,176,176,176,176,176,176,176,176,176,12.001920307,11.6194626,11.625090821,16.038882139,10.337189269,8.9374379345,9.4363049416,8.9175130047,11.411560407,12.503125781,14.402304369,12.58775115,16.953257447,10.206561361,15.751907458,8.9374379345,16.389371741,16.348773842,10.915405607,13.003250813,-2.400384061,-0.96828855,-5.328166626,5.8323207776,-5.414718189,0,-6.953066799,-7.431260837,0.4961548003,-0.500125031,0,1.452432825,0.9687575684,1.4580801944,2.4612355402,2.9791459782,2.979885771,0.4954173892,1.9846192012,2.000500125,-4.320691311,-10.16702977,12.593848389,-23.32928311,-7.383706621,-8.937437934,9.9329525702,5.4495912807,-3.969238402,-15.50387597,-4.320691311,-8.71459695,13.562605958,-21.87120292,-4.92247108,-5.958291956,12.912838341,5.9450086698,-1.984619201,-13.50337584 +050,2,4,46,075,South Dakota,Jones County,1006,1006,1011,1004,991,972,956,917,929,918,924,911,938,5,-7,-13,-19,-16,-39,12,-11,6,-13,27,1,17,9,6,11,12,11,10,11,14,14,1,11,10,11,8,11,12,13,9,8,6,0,6,-1,-5,3,1,-1,-3,2,6,8,0,0,0,0,0,0,0,0,0,0,0,5,-13,-12,-14,-20,-41,13,-7,4,-18,19,5,-13,-12,-14,-20,-41,13,-7,4,-18,19,0,0,0,0,1,1,0,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,16.873449132,9.022556391,6.1130922058,11.410788382,12.813667912,11.917659805,10.82837033,11.943539631,15.258855586,15.143320714,10.918114144,10.025062657,11.207335711,8.2987551867,11.745862253,13.001083424,14.076881429,9.7719869707,8.719346049,6.4899945917,5.9553349876,-1.002506266,-5.094243505,3.112033195,1.0678056594,-1.083423619,-3.248511099,2.1715526602,6.5395095368,8.6533261222,0,0,0,0,0,0,0,0,0,0,-12.90322581,-12.03007519,-14.26388181,-20.74688797,-43.78003203,14.084507042,-7.579859231,4.3431053203,-19.61852861,20.55164954,-12.90322581,-12.03007519,-14.26388181,-20.74688797,-43.78003203,14.084507042,-7.579859231,4.3431053203,-19.61852861,20.55164954 +050,2,4,46,077,South Dakota,Kingsbury County,5148,5147,5132,5167,5229,5064,5051,4951,4970,4922,4896,4907,4987,-15,35,62,-165,-13,-100,19,-48,-26,11,80,11,65,59,63,52,73,66,60,71,60,61,28,74,64,68,75,73,64,77,64,42,52,-17,-9,-5,-5,-23,0,2,-17,7,18,9,1,0,4,1,3,0,2,3,5,0,1,1,44,61,-165,7,-100,15,-34,-39,-7,70,2,44,65,-164,10,-100,17,-31,-34,-7,71,0,0,2,4,0,0,0,0,1,0,0,203,203,203,203,203,203,203,203,203,203,203,203,12.622584717,11.350519431,12.241329059,10.281759763,14.597080584,13.305110372,12.131014962,14.463230801,12.241150668,12.330705478,14.370327216,12.312427857,13.212863111,14.829461196,14.597080584,12.901925209,15.568135867,13.037278468,8.5688054677,10.511421063,-1.747742499,-0.961908426,-0.971534052,-4.547701434,0,0.4031851628,-3.437120906,1.4259523325,3.6723452004,1.8192844148,0,0.7695267411,0.1943068105,0.5931784478,0,0.4031851628,0.6065507481,1.0185373803,0,0.2021427128,8.5445188853,11.735282801,-32.06062372,1.384083045,-19.9960008,3.0238887209,-6.874241812,-7.944591567,-1.428134245,14.149989893,8.5445188853,12.504809542,-31.86631691,1.9772614928,-19.9960008,3.4270738837,-6.267691063,-6.926054186,-1.428134245,14.352132606 +050,2,4,46,079,South Dakota,Lake County,11200,11202,11278,11563,11757,11921,12101,12350,12621,12814,13045,12769,12488,76,285,194,164,180,249,271,193,231,-276,-281,39,116,146,120,140,127,134,127,125,129,122,18,109,118,99,122,109,112,139,128,86,103,21,7,28,21,18,18,22,-12,-3,43,19,6,24,46,-2,0,-1,5,13,0,4,2,45,252,117,142,158,229,244,191,233,-322,-300,51,276,163,140,158,228,249,204,233,-318,-298,4,2,3,3,4,3,0,1,1,-1,-2,874,874,874,874,874,874,874,875,877,879,878,879,10.157173504,12.521440823,10.135991215,11.655982016,10.388123185,10.732449642,9.9862394339,9.6678139139,9.9945765863,9.6606881261,9.5442406199,10.120068611,8.3621927528,10.157355757,8.9157907652,8.9704056706,10.929821113,9.8998414479,6.6630510576,8.1561547294,0.6129328838,2.4013722127,1.7737984627,1.4986262593,1.4723324199,1.762043971,-0.943581679,-0.232027534,3.3315255288,1.5045333967,2.1014841732,3.9451114923,-0.168933187,0,-0.081796246,0.4004645389,1.0222134854,0,0.3099093515,0.1583719365,22.065583819,10.034305317,11.994256272,13.154608276,18.731340231,19.542669497,15.018675054,18.020805136,-24.9477028,-23.75579047,24.167067992,13.97941681,11.825323085,13.154608276,18.649543986,19.943134035,16.040888539,18.020805136,-24.63779345,-23.59741854 +050,2,4,46,081,South Dakota,Lawrence County,24097,24090,24204,24335,24418,24962,24759,24862,25389,25736,25776,25908,26221,114,131,83,544,-203,103,527,347,40,132,313,73,244,219,232,247,217,256,219,235,199,204,31,208,228,242,228,234,230,254,254,213,230,42,36,-9,-10,19,-17,26,-35,-19,-14,-26,-1,-4,21,-7,14,32,130,145,23,102,80,70,99,70,546,-242,89,371,238,38,43,260,69,95,91,539,-228,121,501,383,61,145,340,3,0,1,15,6,-1,0,-1,-2,1,-1,1071,1071,1070,1070,1070,1071,1073,1073,1074,1075,1075,1075,10.053771194,8.9840625192,9.3965168084,9.9354397538,8.7462969307,10.188851963,8.5672371638,9.1240875912,7.7006423651,7.8267375165,8.5704279033,9.353270568,9.8015390846,9.1711751574,9.4314906995,9.1540466856,9.9364303178,9.8617797795,8.2423960994,8.8242628863,1.483343291,-0.369208049,-0.405022276,0.7642645964,-0.685193769,1.0348052775,-1.369193154,-0.737692188,-0.541753734,-0.99752537,-0.164815921,0.861485447,-0.283515593,0.5631423342,1.2897765059,5.1740263875,5.6723716381,0.8929958068,3.9470629208,3.06930883,4.0791940501,2.8716181568,22.114216282,-9.734317492,3.5871909071,14.765875306,9.3105134474,1.4753843765,1.663957898,9.9752536976,3.9143781289,3.7331036039,21.830700689,-9.171175157,4.876967413,19.939901693,14.982885086,2.3683801833,5.6110208188,13.044562528 +050,2,4,46,083,South Dakota,Lincoln County,44828,44827,45185,46808,48414,49918,51601,52997,54568,56732,58881,61235,63019,358,1623,1606,1504,1683,1396,1571,2164,2149,2354,1784,221,755,835,786,783,773,735,869,827,843,854,43,214,211,195,194,210,251,276,259,280,292,178,541,624,591,589,563,484,593,568,563,562,2,4,18,0,8,9,39,29,-19,12,5,159,1069,937,893,1056,817,1042,1532,1594,1782,1219,161,1073,955,893,1064,826,1081,1561,1575,1794,1224,19,9,27,20,30,7,6,10,6,-3,-2,284,284,284,284,284,284,284,284,284,284,284,284,16.414292392,17.537963916,15.986657446,15.425683862,14.780397331,13.666155348,15.615453729,14.306349632,14.03643145,13.746036345,4.6525279097,4.4317489656,3.9661554733,3.8219446606,4.0153731429,4.6669455678,4.9595687332,4.4804649996,4.6621599121,4.7000498978,11.761764482,13.10621495,12.020501973,11.603739202,10.765024188,8.9992097801,10.655884996,9.8258846324,9.3742715375,9.0459864471,0.0869631385,0.3780638928,0,0.1576059654,0.1720874204,0.7251429368,0.521114106,-0.328682761,0.1998068534,0.0804803065,23.240898764,19.680325975,18.162958142,20.803987431,15.621713608,19.374331799,27.529200359,27.574753704,29.671317726,19.621098717,23.327861903,20.058389868,18.162958142,20.961593396,15.793801029,20.099474736,28.050314465,27.246070944,29.87112458,19.701579024 +050,2,4,46,085,South Dakota,Lyman County,3755,3755,3761,3808,3775,3843,3852,3875,3905,3869,3796,3787,3797,6,47,-33,68,9,23,30,-36,-73,-9,10,9,83,63,58,78,65,87,70,62,64,68,4,49,40,35,25,36,43,33,33,32,16,5,34,23,23,53,29,44,37,29,32,52,0,0,0,0,0,0,0,0,0,0,0,1,13,-58,44,-45,-6,-13,-73,-101,-41,-42,1,13,-58,44,-45,-6,-13,-73,-101,-41,-42,0,0,2,1,1,0,-1,0,-1,0,0,37,37,37,36,36,36,35,36,36,37,37,37,21.931562954,16.616114994,15.227093725,20.272904483,16.824123204,22.36503856,18.008747106,16.177429876,16.879862851,17.932489451,12.947549214,10.549914282,9.188763455,6.497725796,9.3179759286,11.053984576,8.4898379213,8.6105675147,8.4399314256,4.2194092827,8.9840137403,6.0662007121,6.0383302704,13.775178687,7.5061472758,11.311053985,9.5189091845,7.5668623614,8.4399314256,13.713080169,0,0,0,0,0,0,0,0,0,0,3.4350640772,-15.29737571,11.551588343,-11.69590643,-1.552995988,-3.341902314,-18.78055055,-26.35355512,-10.81366214,-11.07594937,3.4350640772,-15.29737571,11.551588343,-11.69590643,-1.552995988,-3.341902314,-18.78055055,-26.35355512,-10.81366214,-11.07594937 +050,2,4,46,087,South Dakota,McCook County,5618,5618,5609,5539,5565,5595,5549,5485,5513,5549,5572,5560,5520,-9,-70,26,30,-46,-64,28,36,23,-12,-40,19,80,63,79,73,78,87,71,90,82,90,32,67,85,59,79,92,76,64,75,59,75,-13,13,-22,20,-6,-14,11,7,15,23,15,3,8,15,2,0,9,11,17,3,15,11,2,-91,34,9,-41,-59,6,12,5,-49,-67,5,-83,49,11,-41,-50,17,29,8,-34,-56,-1,0,-1,-1,1,0,0,0,0,-1,1,312,312,312,312,312,312,312,312,312,312,312,312,14.352350197,11.347262248,14.157706093,13.101220388,14.138118543,15.821058374,12.836738384,16.185594821,14.73230327,16.245487365,12.02009329,15.309798271,10.573476703,14.178033022,16.675729563,13.820694672,11.571144459,13.487995684,10.600071865,13.537906137,2.3322569071,-3.962536023,3.5842293907,-1.076812635,-2.53761102,2.0003637025,1.2655939251,2.6975991368,4.132231405,2.7075812274,1.4352350197,2.7017291066,0.3584229391,0,1.6313213703,2.0003637025,3.0735852468,0.5395198274,2.694933525,1.9855595668,-16.32579835,6.1239193084,1.6129032258,-7.35821967,-10.69421787,1.0911074741,2.169589586,0.8991997123,-8.803449515,-12.09386282,-14.89056333,8.825648415,1.9713261649,-7.35821967,-9.062896502,3.0914711766,5.2431748328,1.4387195396,-6.10851599,-10.10830325 +050,2,4,46,089,South Dakota,McPherson County,2459,2459,2455,2451,2428,2425,2420,2399,2414,2403,2405,2388,2363,-4,-4,-23,-3,-5,-21,15,-11,2,-17,-25,3,25,25,21,29,25,19,27,20,25,25,4,36,37,41,38,42,33,44,28,27,30,-1,-11,-12,-20,-9,-17,-14,-17,-8,-2,-5,0,0,0,-1,0,-1,0,0,0,0,0,-2,5,-11,18,4,-3,30,7,10,-15,-20,-2,5,-11,17,4,-4,30,7,10,-15,-20,-1,2,0,0,0,0,-1,-1,0,0,0,347,347,347,347,347,347,347,347,347,347,347,347,10.19160212,10.24800164,8.6544405522,11.971104231,10.375596597,7.8952836069,11.210296865,8.3194675541,10.431879825,10.524100189,14.675907053,15.167042427,16.896764888,15.68627451,17.431002283,13.712861001,18.268631929,11.647254576,11.266430211,12.628920227,-4.484304933,-4.919040787,-8.242324335,-3.715170279,-7.055405686,-5.817577395,-7.058335063,-3.327787022,-0.834550386,-2.104820038,0,0,-0.412116217,0,-0.415023864,0,0,0,0,0,2.038320424,-4.509120721,7.4180919019,1.6511867905,-1.245071592,12.466237274,2.9063732614,4.159733777,-6.259127895,-8.419280152,2.038320424,-4.509120721,7.0059756851,1.6511867905,-1.660095455,12.466237274,2.9063732614,4.159733777,-6.259127895,-8.419280152 +050,2,4,46,091,South Dakota,Marshall County,4656,4656,4643,4627,4694,4802,4734,4830,4835,4898,4873,4913,4884,-13,-16,67,108,-68,96,5,63,-25,40,-29,15,60,51,64,69,66,72,77,75,62,67,28,56,66,47,44,49,53,56,37,25,49,-13,4,-15,17,25,17,19,21,38,37,18,0,40,33,2,0,28,9,52,-1,8,3,1,-60,48,89,-94,51,-22,-9,-62,-6,-49,1,-20,81,91,-94,79,-13,43,-63,2,-46,-1,0,1,0,1,0,-1,-1,0,1,-1,373,373,373,373,373,373,373,373,373,373,373,373,12.944983819,10.943031864,13.47935973,14.47147651,13.801756587,14.899120538,15.822459673,15.351550507,12.671162886,13.677656425,12.081984898,14.161570647,9.898904802,9.2281879195,10.246758678,10.967408174,11.507243399,7.5734315833,5.1093398733,10.003062162,0.8629989213,-3.218538783,3.5804549284,5.2432885906,3.5549979088,3.9317123642,4.3152162745,7.7781189233,7.5618230125,3.6745942636,8.6299892125,7.0807853235,0.4212299916,0,5.8552906734,1.8623900673,10.685297442,-0.20468734,1.6349887595,0.6124323773,-12.94498382,10.299324107,18.744734625,-19.7147651,10.664993726,-4.552509053,-1.849378403,-12.69061509,-1.22624157,-10.00306216,-4.314994606,17.38010943,19.165964617,-19.7147651,16.5202844,-2.690118986,8.8359190383,-12.89530243,0.4087471899,-9.390629785 +050,2,4,46,093,South Dakota,Meade County,25434,25433,25478,25504,25851,26417,26737,26794,27374,28007,28305,28469,28588,45,26,347,566,320,57,580,633,298,164,119,78,310,315,346,311,309,294,253,281,244,253,26,176,160,196,193,197,172,218,223,215,227,52,134,155,150,118,112,122,35,58,29,26,20,12,133,46,50,61,46,51,-15,26,26,-24,-120,63,363,147,-115,411,541,254,108,68,-4,-108,196,409,197,-54,457,592,239,134,94,-3,0,-4,7,5,-1,1,6,1,1,-1,797,794,791,790,793,790,793,792,794,810,820,820,12.161154917,12.267549411,13.239458177,11.701847462,11.54471241,10.855117412,9.1367075351,9.9801108112,8.5954838482,8.8683246578,6.9043976305,6.2311362087,7.4998086784,7.2619181999,7.3602211803,6.350612908,7.8727361369,7.9201591135,7.5738894564,7.9569553254,5.2567572869,6.0364132022,5.7396494987,4.4399292621,4.1844912294,4.5045045045,1.2639713981,2.0599516977,1.0215943918,0.9113693324,0.4707543839,5.1796319735,1.7601591796,1.8813259585,2.2790532589,1.6984197312,1.8417868944,-0.532746129,0.9159122133,0.9113693324,-4.707543839,2.4535098822,13.889951787,5.5310983181,-4.296575816,15.175011077,19.537386468,9.0211677795,3.8045584246,2.3835813309,-4.236789455,7.6331418557,15.650110967,7.4124242766,-2.017522557,16.873430808,21.379173363,8.4884216508,4.720470638,3.2949506634 +050,2,4,46,095,South Dakota,Mellette County,2048,2043,2026,2073,2052,2048,2068,2027,2071,2066,2032,2068,2089,-17,47,-21,-4,20,-41,44,-5,-34,36,21,5,43,22,32,27,50,35,48,39,31,31,17,19,26,22,16,25,27,32,34,19,23,-12,24,-4,10,11,25,8,16,5,12,8,0,0,2,0,1,0,0,0,0,0,0,-5,23,-19,-15,7,-65,36,-21,-39,24,14,-5,23,-17,-15,8,-65,36,-21,-39,24,14,0,0,0,1,1,-1,0,0,0,0,-1,49,49,49,49,49,49,49,48,48,49,49,49,20.980727007,10.666666667,15.609756098,13.119533528,24.42002442,17.081503172,23.205221175,19.033674963,15.12195122,14.914601876,9.2705537936,12.606060606,10.731707317,7.7745383868,12.21001221,13.17715959,15.47014745,16.593460224,9.2682926829,11.06567236,11.710173213,-1.939393939,4.8780487805,5.3449951409,12.21001221,3.9043435822,7.7350737249,2.4402147389,5.8536585366,3.8489295165,0,0.9696969697,0,0.4859086492,0,0,0,0,0,0,11.222249329,-9.212121212,-7.317073171,3.4013605442,-31.74603175,17.56954612,-10.15228426,-19.03367496,11.707317073,6.7356266538,11.222249329,-8.242424242,-7.317073171,3.8872691934,-31.74603175,17.56954612,-10.15228426,-19.03367496,11.707317073,6.7356266538 +050,2,4,46,097,South Dakota,Miner County,2389,2389,2374,2325,2298,2312,2281,2208,2233,2200,2211,2221,2202,-15,-49,-27,14,-31,-73,25,-33,11,10,-19,3,19,23,25,23,28,30,17,32,23,24,12,36,40,25,35,31,35,33,30,29,23,-9,-17,-17,0,-12,-3,-5,-16,2,-6,1,0,0,0,0,1,0,-1,-1,-1,-1,-1,-7,-32,-10,15,-21,-70,31,-16,10,18,-19,-7,-32,-10,15,-20,-70,30,-17,9,17,-20,1,0,0,-1,1,0,0,0,0,-1,0,80,80,80,80,80,80,80,80,80,80,80,80,8.0868269845,9.9502487562,10.845986985,10.015240583,12.474938739,13.510470615,7.6697496052,14.509181591,10.379061372,10.85236265,15.322409023,17.304780446,10.845986985,15.240583497,13.811539318,15.762215717,14.888337469,13.602357742,13.086642599,10.400180873,-7.235582039,-7.354531689,0,-5.225342913,-1.336600579,-2.251745102,-7.218587864,0.9068238495,-2.707581227,0.4521817771,0,0,0,0.4354452428,0,-0.45034902,-0.451161741,-0.453411925,-0.451263538,-0.452181777,-13.61991913,-4.326195111,6.5075921909,-9.144350098,-31.18734685,13.960819635,-7.218587864,4.5341192473,8.1227436823,-8.591453764,-13.61991913,-4.326195111,6.5075921909,-8.708904855,-31.18734685,13.510470615,-7.669749605,4.0807073226,7.6714801444,-9.043635541 +050,2,4,46,099,South Dakota,Minnehaha County,169468,169474,169964,171482,174825,178062,180925,183563,186562,189786,191250,194153,196659,490,1518,3343,3237,2863,2638,2999,3224,1464,2903,2506,742,2758,2790,2763,2964,2973,3036,2903,2958,2830,2856,353,1309,1282,1243,1300,1377,1343,1442,1463,1482,1532,389,1449,1508,1520,1664,1596,1693,1461,1495,1348,1324,107,424,846,109,606,799,1551,1514,320,1020,800,12,-350,968,1573,594,260,-235,253,-343,528,370,119,74,1814,1682,1200,1059,1316,1767,-23,1548,1170,-18,-5,21,35,-1,-17,-10,-4,-8,7,12,6291,6291,6290,6278,6271,6274,6266,6265,6267,6268,6266,6269,16.154823896,16.11287095,15.659403718,16.513132788,16.313294265,16.40526849,15.427210986,15.526092023,14.68592616,14.615723161,7.6673910369,7.4038353253,7.0447480355,7.2426020998,7.5558043063,7.2570077676,7.6631203035,7.6790644454,7.6906510847,7.8400867937,8.4874328591,8.7090356245,8.614655683,9.2705306877,8.7574899585,9.1482607227,7.764090682,7.8470275774,6.9952750757,6.7756363674,2.4835552327,4.885838288,0.6177614931,3.376166825,4.3842321284,8.380952381,8.0457448957,1.6796313209,5.2931606656,4.0940401011,-2.050104555,5.5904154406,8.9150351246,3.3093120364,1.4266587652,-1.26984127,1.3445003029,-1.800354822,2.7399890504,1.8934935468,0.4334506774,10.476253729,9.5327966176,6.6854788614,5.8108908935,7.1111111111,9.3902451986,-0.120723501,8.033149716,5.9875336479 +050,2,4,46,101,South Dakota,Moody County,6486,6493,6493,6499,6492,6452,6436,6454,6499,6483,6479,6555,6525,0,6,-7,-40,-16,18,45,-16,-4,76,-30,16,92,81,88,106,89,83,94,85,87,86,14,48,42,73,51,49,62,54,59,53,54,2,44,39,15,55,40,21,40,26,34,32,0,25,40,12,24,13,14,4,-3,2,0,-2,-63,-88,-67,-98,-34,9,-60,-25,40,-62,-2,-38,-48,-55,-74,-21,23,-56,-28,42,-62,0,0,2,0,3,-1,1,0,-2,0,0,164,164,164,164,164,164,164,164,164,164,164,164,14.162561576,12.470171657,13.597033375,16.449410304,13.809154383,12.815563962,14.481589894,13.115259991,13.349700783,13.149847095,7.3891625616,6.4660149334,11.279357231,7.9143389199,7.6027928627,9.5730718752,8.3192112155,9.1035334053,8.1325763388,8.2568807339,6.7733990148,6.0041567239,2.3176761434,8.5350713842,6.2063615206,3.2424920868,6.1623786782,4.0117265854,5.2171244438,4.8929663609,3.8485221675,6.1581094604,1.8541409147,3.7243947858,2.0170674942,2.1616613912,0.6162378678,-0.462891529,0.3068896732,0,-9.698275862,-13.54784081,-10.35228677,-15.20794538,-5.275407292,1.3896394658,-9.243568017,-3.857429409,6.1377934632,-9.480122324,-5.849753695,-7.389731352,-8.498145859,-11.48355059,-3.258339798,3.5513008569,-8.627330149,-4.320320938,6.4446831364,-9.480122324 +050,2,4,46,102,South Dakota,Oglala Lakota County,13586,13586,13636,13897,14041,14130,14217,14364,14426,14392,14324,14171,14070,50,261,144,89,87,147,62,-34,-68,-153,-101,97,354,347,336,339,328,303,298,288,277,260,54,117,125,124,106,144,148,162,178,157,172,43,237,222,212,233,184,155,136,110,120,88,0,-2,0,0,-2,-3,-3,-5,-5,-5,-2,6,27,-77,-125,-147,-33,-89,-168,-172,-267,-187,6,25,-77,-125,-149,-36,-92,-173,-177,-272,-189,1,-1,-1,2,3,-1,-1,3,-1,-1,0,91,91,91,91,91,91,91,91,92,92,92,92,25.714597029,24.840718734,23.854318271,23.917874907,22.952310976,21.048975339,20.681518495,20.05850397,19.44200737,18.412945717,8.4988922384,8.9483857112,8.8033793618,7.4787455463,10.076624331,10.28134769,11.242973142,12.397269815,11.019477101,12.180871782,17.215704791,15.892333023,15.050938909,16.439129361,12.875686645,10.767627648,9.4385453536,7.6612341552,8.4225302685,6.2320739351,-0.145280209,0,0,-0.141108407,-0.209929674,-0.208405696,-0.347005344,-0.348237916,-0.350938761,-0.141638044,1.9612828242,-5.512205598,-8.874374357,-10.37146788,-2.309226409,-6.182702327,-11.65937955,-11.97938432,-18.74012985,-13.24315711,1.816002615,-5.512205598,-8.874374357,-10.51257629,-2.519156083,-6.391108024,-12.0063849,-12.32762223,-19.09106861,-13.38479516 +050,2,4,46,103,South Dakota,Pennington County,100948,100966,101253,102443,104291,106003,107613,108212,109240,110686,112260,114407,115926,287,1190,1848,1712,1610,599,1028,1446,1574,2147,1519,392,1513,1543,1587,1563,1561,1487,1456,1524,1505,1499,232,801,773,818,759,837,932,942,954,975,1045,160,712,770,769,804,724,555,514,570,530,454,26,29,177,10,56,100,273,284,-2,174,145,97,450,880,918,744,-212,203,645,1002,1439,923,123,479,1057,928,800,-112,476,929,1000,1613,1068,4,-1,21,15,6,-13,-3,3,4,4,-3,2575,2575,2573,2571,2573,2568,2565,2567,2568,2569,2568,2571,14.855470898,14.927394623,15.093155297,14.633735301,14.465423375,13.676581498,13.240817366,13.671472016,13.279392236,13.015937794,7.8646610635,7.4782087126,7.7795847718,7.1062092727,7.7562840264,8.5720066957,8.5665178287,8.558126183,8.6029285251,9.0738192096,6.9908098343,7.4491859104,7.3135705251,7.527526028,6.709139349,5.1045748027,4.6742995371,5.1133458326,4.6764637111,3.9421185848,0.284738041,1.7123453326,0.0951049483,0.5243052955,0.9266767057,2.510898957,2.5826869038,-0.017941564,1.5352918599,1.2590466846,4.4183489121,8.5133553262,8.7306342549,6.9657703543,-1.964554616,1.8670787116,5.8656093413,8.9887237268,12.697040151,8.0144833784,4.7030869531,10.225700659,8.8257392032,7.4900756498,-1.03787791,4.3779776686,8.4482962451,8.9707821625,14.232332011,9.273530063 +050,2,4,46,105,South Dakota,Perkins County,2982,2991,2988,3017,3031,3024,3022,2983,2958,2962,2899,2833,2832,-3,29,14,-7,-2,-39,-25,4,-63,-66,-1,15,22,33,34,38,34,32,47,38,31,37,23,46,48,45,37,48,40,34,51,26,23,-8,-24,-15,-11,1,-14,-8,13,-13,5,14,0,0,1,0,0,0,0,0,0,0,0,4,53,27,4,-3,-24,-16,-10,-49,-71,-14,4,53,28,4,-3,-24,-16,-10,-49,-71,-14,1,0,1,0,0,-1,-1,1,-1,0,-1,65,65,65,65,65,65,65,65,65,65,65,65,7.3272273106,10.912698413,11.230388109,12.57029441,11.323896753,10.772597206,15.878378378,12.967070466,10.816468946,13.06266549,15.320566195,15.873015873,14.863748968,12.239497188,15.986677769,13.465746507,11.486486486,17.40317352,9.0718771807,8.1200353045,-7.993338884,-4.96031746,-3.633360859,0.3307972213,-4.662781016,-2.693149301,4.3918918919,-4.436103054,1.7445917655,4.9426301853,0,0.3306878307,0,0,0,0,0,0,0,0,17.651956703,8.9285714286,1.3212221305,-0.992391664,-7.993338884,-5.386298603,-3.378378378,-16.72069613,-24.77320307,-4.942630185,17.651956703,9.2592592593,1.3212221305,-0.992391664,-7.993338884,-5.386298603,-3.378378378,-16.72069613,-24.77320307,-4.942630185 +050,2,4,46,107,South Dakota,Potter County,2329,2334,2351,2370,2340,2358,2307,2297,2261,2216,2205,2149,2163,17,19,-30,18,-51,-10,-36,-45,-11,-56,14,8,22,28,19,28,19,31,20,21,19,22,3,32,52,31,32,38,41,34,35,20,26,5,-10,-24,-12,-4,-19,-10,-14,-14,-1,-4,0,0,0,1,0,1,1,3,1,2,2,12,28,-5,29,-47,8,-26,-35,2,-55,15,12,28,-5,30,-47,9,-25,-32,3,-53,17,0,1,-1,0,0,0,-1,1,0,-2,1,63,63,63,63,63,63,63,63,63,63,63,63,9.3200593095,11.889596603,8.0885483184,12.004287245,8.2536924414,13.602457218,8.9345543891,9.5001130966,8.7276067983,10.204081633,13.556449905,22.080679406,13.197105151,13.719185423,16.507384883,17.990346643,15.188742461,15.833521828,9.1869545246,12.059369202,-4.236390595,-10.1910828,-5.108556833,-1.714898178,-8.253692441,-4.387889425,-6.254188072,-6.333408731,-0.459347726,-1.85528757,0,0,0.4257130694,0,0.4344048653,0.4387889425,1.3401831584,0.4523863379,0.9186954525,0.9276437848,11.861893667,-2.123142251,12.345679012,-20.15005359,3.4752389227,-11.40851251,-15.63547018,0.9047726759,-25.26412494,6.9573283859,11.861893667,-2.123142251,12.771392082,-20.15005359,3.909643788,-10.96972356,-14.29528702,1.3571590138,-24.34542949,7.8849721707 +050,2,4,46,109,South Dakota,Roberts County,10149,10147,10189,10291,10323,10238,10280,10210,10192,10269,10358,10399,10331,42,102,32,-85,42,-70,-18,77,89,41,-68,37,175,189,179,190,175,175,172,163,173,161,17,121,115,136,99,129,117,106,122,93,115,20,54,74,43,91,46,58,66,41,80,46,0,8,12,1,-1,11,9,20,1,5,3,22,42,-54,-131,-47,-128,-84,-8,47,-43,-118,22,50,-42,-130,-48,-117,-75,12,48,-38,-115,0,-2,0,2,-1,1,-1,-1,0,-1,1,281,281,281,281,281,281,281,281,281,281,281,281,17.08984375,18.337052489,17.411604494,18.520323618,17.081503172,17.155180865,16.812472509,15.804528046,16.669075493,15.533043898,11.81640625,11.1574658,13.228928554,9.650063359,12.591508053,11.469463778,10.361174918,11.829155961,8.9608324902,11.095031356,5.2734375,7.1795866887,4.1826759399,8.8702602593,4.4899951196,5.6857170866,6.4512975905,3.9753720851,7.7082430024,4.4380125422,0.78125,1.1642573009,0.0972715335,-0.097475387,1.0736944851,0.8822664445,1.9549386638,0.0969602948,0.4817651876,0.2894356006,4.1015625,-5.239157854,-12.74257089,-4.581343211,-12.49389946,-8.234486815,-0.781975466,4.5571338537,-4.143180614,-11.38446696,4.8828125,-4.074900553,-12.64529935,-4.678818598,-11.42020498,-7.352220371,1.1729631983,4.6540941484,-3.661415426,-11.09503136 +050,2,4,46,111,South Dakota,Sanborn County,2355,2355,2354,2355,2318,2325,2331,2348,2371,2437,2387,2345,2322,-1,1,-37,7,6,17,23,66,-50,-42,-23,5,28,29,35,35,38,35,38,29,37,32,4,25,36,32,34,27,30,24,30,15,15,1,3,-7,3,1,11,5,14,-1,22,17,0,0,1,0,3,3,3,3,1,2,1,-1,-2,-32,4,2,3,16,50,-50,-67,-40,-1,-2,-31,4,5,6,19,53,-49,-65,-39,-1,0,1,0,0,0,-1,-1,0,1,-1,174,174,174,174,174,174,174,174,174,174,174,174,11.89212147,12.411726942,15.076459186,15.034364261,16.24278692,14.833651197,15.806988353,12.023217247,15.638207946,13.713306192,10.617965598,15.407661031,13.784191256,14.604810997,11.540927549,12.714558169,9.9833610649,12.437810945,6.3398140321,6.4281122777,1.2741558717,-2.995934089,1.2922679302,0.4295532646,4.7018593717,2.1190930282,5.8236272879,-0.414593698,9.2983939138,7.2851939147,0,0.4279905842,0,1.2886597938,1.2823252832,1.2714558169,1.2479201331,0.4145936982,0.8453085376,0.4285408185,-0.849437248,-13.69569869,1.723023907,0.8591065292,1.2823252832,6.7810976902,20.798668885,-20.72968491,-28.31783601,-17.14163274,-0.849437248,-13.26770811,1.723023907,2.147766323,2.5646505664,8.0525535071,22.046589018,-20.31509121,-27.47252747,-16.71309192 +050,2,4,46,115,South Dakota,Spink County,6415,6415,6421,6562,6736,6663,6655,6555,6483,6516,6469,6401,6319,6,141,174,-73,-8,-100,-72,33,-47,-68,-82,17,74,86,75,86,68,64,93,73,94,81,7,79,84,78,70,75,86,77,74,60,67,10,-5,2,-3,16,-7,-22,16,-1,34,14,-1,71,38,0,0,0,-1,12,0,0,0,-3,75,130,-71,-25,-93,-50,6,-45,-102,-97,-4,146,168,-71,-25,-93,-51,18,-45,-102,-97,0,0,4,1,1,0,1,-1,-1,0,1,404,404,404,404,403,404,404,404,404,404,404,404,11.399522452,12.934275831,11.194865288,12.91485208,10.295230886,9.8174566651,14.308792984,11.24374278,14.607614608,12.735849057,12.169760456,12.633478719,11.6426599,10.512088902,11.355034065,13.192207394,11.847065159,11.397766654,9.324009324,10.534591195,-0.770238004,0.3007971123,-0.447794612,2.4027631777,-1.059803179,-3.374750729,2.4617278252,-0.154023874,5.2836052836,2.2012578616,10.93737965,5.7151451346,0,0,0,-0.15339776,1.8462958689,0,0,0,11.553570053,19.551812303,-10.59780581,-3.754317465,-14.08024224,-7.66988802,0.9231479345,-6.931074317,-15.85081585,-15.25157233,22.490949703,25.266957437,-10.59780581,-3.754317465,-14.08024224,-7.82328578,2.7694438034,-6.931074317,-15.85081585,-15.25157233 +050,2,4,46,117,South Dakota,Stanley County,2966,2966,2972,2979,2978,2982,2984,2978,3016,2987,3035,3129,3121,6,7,-1,4,2,-6,38,-29,48,94,-8,7,37,42,31,37,38,45,43,36,35,35,9,20,19,19,21,21,16,31,13,12,16,-2,17,23,12,16,17,29,12,23,23,19,0,0,0,0,0,0,-1,-1,-1,-1,-1,9,-11,-24,-9,-13,-23,10,-38,24,73,-27,9,-11,-24,-9,-13,-23,9,-39,23,72,-28,-1,1,0,1,-1,0,0,-2,2,-1,1,0,0,0,0,0,1,0,0,0,0,0,0,12.434884893,14.101057579,10.402684564,12.403620516,12.747400201,15.015015015,14.326170248,11.956160744,11.356262167,11.2,6.7215594018,6.3790498573,6.3758389262,7.0398927254,7.0446159007,5.3386720053,10.328169249,4.3175024909,3.8935756003,5.12,5.7133254915,7.722007722,4.0268456376,5.3637277908,5.7027843006,9.6763430097,3.9980009995,7.6386582531,7.4626865672,6.08,0,0,0,0,0,-0.333667,-0.33316675,-0.332115576,-0.324464633,-0.32,-3.696857671,-8.057747188,-3.020134228,-4.35802883,-7.715531701,3.3366700033,-12.6603365,7.9707738293,23.685918235,-8.64,-3.696857671,-8.057747188,-3.020134228,-4.35802883,-7.715531701,3.003003003,-12.99350325,7.6386582531,23.361453602,-8.96 +050,2,4,46,119,South Dakota,Sully County,1373,1368,1377,1374,1429,1436,1406,1402,1409,1400,1373,1377,1391,9,-3,55,7,-30,-4,7,-9,-27,4,14,9,15,20,13,15,14,13,20,15,21,16,0,13,10,15,6,7,11,6,12,12,11,9,2,10,-2,9,7,2,14,3,9,5,0,3,4,2,1,0,0,0,0,0,0,0,-9,39,7,-42,-11,6,-23,-30,-5,9,0,-6,43,9,-41,-11,6,-23,-30,-5,9,0,1,2,0,2,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,10.905125409,14.270424545,9.07504363,10.555946517,9.9715099715,9.2493774457,14.23994304,10.818608006,15.272727273,11.560693642,9.4511086877,7.1352122726,10.471204188,4.2223786066,4.9857549858,7.8263963002,4.2719829121,8.6548864046,8.7272727273,7.9479768786,1.4540167212,7.1352122726,-1.396160558,6.3335679099,4.9857549858,1.4229811455,9.9679601282,2.1637216012,6.5454545455,3.612716763,2.1810250818,2.854084909,1.3961605585,0.7037297678,0,0,0,0,0,0,-6.543075245,27.827327863,4.8865619546,-29.55665025,-7.834757835,4.2689434365,-16.3759345,-21.63721601,-3.636363636,6.5028901734,-4.362050164,30.681412772,6.2827225131,-28.85292048,-7.834757835,4.2689434365,-16.3759345,-21.63721601,-3.636363636,6.5028901734 +050,2,4,46,121,South Dakota,Todd County,9612,9610,9643,9848,9914,9999,9958,10050,10253,10332,10341,10303,10313,33,205,66,85,-41,92,203,79,9,-38,10,66,276,285,290,278,262,256,275,239,232,230,37,61,101,114,77,96,95,101,89,132,123,29,215,184,176,201,166,161,174,150,100,107,0,0,0,0,10,34,81,81,8,49,40,4,-8,-118,-89,-258,-109,-38,-178,-149,-186,-138,4,-8,-118,-89,-248,-75,43,-97,-141,-137,-98,0,-2,0,-2,6,1,-1,2,0,-1,1,28,28,28,28,28,28,28,28,28,28,28,28,28.320763429,28.84323449,29.12670115,27.859898782,26.18952419,25.217948086,26.718484333,23.1219465,22.47626429,22.312766783,6.2592991637,10.221637486,11.449806659,7.7165906699,9.5961615354,9.3582229227,9.8129706097,8.6102645963,12.788219337,11.932479627,22.061464266,18.621597004,17.676894491,20.143308112,16.593362655,15.859725164,16.905513724,14.511681904,9.6880449525,10.380287156,0,0,0,1.0021546325,3.3986405438,7.9791163867,7.8698081127,0.7739563682,4.7471420267,3.8804811797,-0.820891694,-11.94211112,-8.938884146,-25.85558952,-10.89564174,-3.743289169,-17.29414622,-14.41493736,-18.01976361,-13.38766007,-0.820891694,-11.94211112,-8.938884146,-24.85343489,-7.4970012,4.2358272177,-9.42433811,-13.64098099,-13.27262158,-9.50717889 +050,2,4,46,123,South Dakota,Tripp County,5644,5649,5647,5634,5519,5525,5512,5423,5502,5448,5484,5430,5377,-2,-13,-115,6,-13,-89,79,-54,36,-54,-53,12,61,72,67,64,68,78,81,90,80,83,13,72,74,60,81,62,71,97,67,58,74,-1,-11,-2,7,-17,6,7,-16,23,22,9,-1,1,-1,-2,0,-2,3,3,1,2,1,0,-3,-114,2,5,-93,70,-42,15,-79,-63,-1,-2,-115,0,5,-95,73,-39,16,-77,-62,0,0,2,-1,-1,0,-1,1,-3,1,0,131,131,131,131,131,131,131,131,131,131,131,131,10.814644092,12.911324307,12.133285042,11.597354354,12.437128487,14.279176201,14.794520548,16.465422613,14.660069635,15.360414546,12.764825813,13.269972205,10.865628396,14.677901604,11.339734797,12.99771167,17.716894977,12.257592389,10.628550486,13.694827427,-1.950181721,-0.358647897,1.2676566461,-3.08054725,1.09739369,1.2814645309,-2.922374429,4.2078302232,4.0315191497,1.6655871195,0.1772892474,-0.179323949,-0.362187613,0,-0.365797897,0.5491990847,0.5479452055,0.1829491401,0.3665017409,0.1850652355,-0.531867742,-20.44293015,0.3621876132,0.9060433089,-17.00960219,12.814645309,-7.671232877,2.7442371021,-14.47681876,-11.65910984,-0.354578495,-20.6222541,0,0.9060433089,-17.37540009,13.363844394,-7.123287671,2.9271862422,-14.11031702,-11.4740446 +050,2,4,46,125,South Dakota,Turner County,8347,8349,8352,8356,8301,8308,8193,8133,8258,8290,8392,8316,8368,3,4,-55,7,-115,-60,125,32,102,-76,52,26,91,90,81,86,93,90,92,102,95,90,28,102,100,85,104,131,108,118,99,95,89,-2,-11,-10,-4,-18,-38,-18,-26,3,0,1,0,0,2,0,5,3,3,8,0,2,1,4,17,-49,12,-105,-23,141,51,101,-77,51,4,17,-47,12,-100,-20,144,59,101,-75,52,1,-2,2,-1,3,-2,-1,-1,-2,-1,-1,153,153,153,153,153,153,153,153,153,153,153,153,10.892985396,10.806267635,9.753747968,10.42361069,11.392870268,10.981636264,11.11916848,12.22874955,11.371797941,10.788779669,12.209719895,12.006964039,10.235414534,12.605296649,16.048021561,13.177963517,14.26154218,11.869080446,11.371797941,10.668904339,-1.316734498,-1.200696404,-0.481666566,-2.181685958,-4.655151292,-2.196327253,-3.142373701,0.3596691044,0,0.1198753297,0,0.2401392808,0,0.6060238773,0.3675119441,0.3660545421,0.9668842156,0,0.2394062724,0.1198753297,2.0349533158,-5.883412379,1.444999699,-12.72650142,-2.817591572,17.20456348,6.1638868745,12.108859849,-9.217141489,6.1136418125,2.0349533158,-5.643273098,1.444999699,-12.12047755,-2.450079628,17.570618022,7.1307710902,12.108859849,-8.977735217,6.2335171422 +050,2,4,46,127,South Dakota,Union County,14399,14394,14488,14641,14801,14761,14996,14934,15174,15311,15616,16003,16192,94,153,160,-40,235,-62,240,137,305,387,189,51,178,170,157,146,147,185,163,190,166,175,37,120,108,116,115,131,110,123,138,121,134,14,58,62,41,31,16,75,40,52,45,41,1,-2,-6,-6,4,46,105,110,11,77,60,77,96,101,-73,199,-125,61,-12,242,264,89,78,94,95,-79,203,-79,166,98,253,341,149,2,1,3,-2,1,1,-1,-1,0,1,-1,89,89,89,89,89,89,89,89,89,89,89,89,12.221497477,11.548128524,10.621744131,9.8128171523,9.822920147,12.2890926,10.693783828,12.286998416,10.500015813,10.8712533,8.2392117821,7.3364581211,7.8479128611,7.7292737843,8.7537587705,7.3070280324,8.0695423979,8.9242409545,7.6536259844,8.3242739556,3.9822856947,4.2116704028,2.7738312699,2.0835433679,1.0691613765,4.9820645676,2.6242414302,3.3627574611,2.8463898289,2.5469793446,-0.137320196,-0.407581007,-0.405926527,0.2688443055,3.0738389576,6.9748903946,7.2166639331,0.7113525399,4.8704892628,3.7272868458,6.5913694257,6.8609469465,-4.938772749,13.375004201,-8.352823254,4.0520791816,-0.787272429,15.649755877,16.69882033,5.5288088212,6.4540492293,6.4533659398,-5.344699276,13.643848506,-5.278984297,11.026969576,6.429391504,16.361108417,21.569309592,9.256095667 +050,2,4,46,129,South Dakota,Walworth County,5438,5438,5443,5561,5449,5489,5508,5412,5469,5480,5450,5421,5336,5,118,-112,40,19,-96,57,11,-30,-29,-85,16,70,66,66,80,80,73,79,70,75,65,23,79,80,76,87,108,76,91,67,58,55,-7,-9,-14,-10,-7,-28,-3,-12,3,17,10,0,4,9,2,22,27,23,19,4,15,9,12,123,-110,47,5,-94,37,4,-36,-62,-103,12,127,-101,49,27,-67,60,23,-32,-47,-94,0,0,3,1,-1,-1,0,0,-1,1,-1,152,152,152,152,152,152,152,152,152,152,152,152,12.72264631,11.989100817,12.068019748,14.54942257,14.652014652,13.417884386,14.430541602,12.808783166,13.79817864,12.085153853,14.358415122,14.532243415,13.896507588,15.822497045,19.78021978,13.969304292,16.622522605,12.259835316,10.670591482,10.225899414,-1.635768811,-2.543142598,-1.828487841,-1.273074475,-5.128205128,-0.551419906,-2.191981003,0.54894785,3.1275871585,1.859254439,0.7270083606,1.6348773842,0.3656975681,4.0010912067,4.9450549451,4.2275526146,3.4706365878,0.7319304666,2.7596357281,1.6733289951,22.355507088,-19.9818347,8.5938928506,0.9093389106,-17.21611722,6.8008455105,0.7306603343,-6.587374199,-11.40649434,-19.15032072,23.082515449,-18.34695731,8.9595904187,4.9104301173,-12.27106227,11.028398125,4.2012969221,-5.855443733,-8.646858615,-17.47699173 +050,2,4,46,135,South Dakota,Yankton County,22438,22438,22436,22507,22594,22654,22695,22702,22653,22691,22807,22837,22742,-2,71,87,60,41,7,-49,38,116,30,-95,54,259,249,272,278,268,284,305,283,229,248,66,221,206,201,202,240,265,243,247,240,232,-12,38,43,71,76,28,19,62,36,-11,16,2,-6,3,-4,10,14,19,28,-1,20,17,11,40,44,-4,-40,-33,-86,-53,83,20,-128,13,34,47,-8,-30,-19,-67,-25,82,40,-111,-3,-1,-3,-3,-5,-2,-1,1,-2,1,0,2296,2296,2296,2297,2296,2298,2296,2294,2294,2294,2292,2293,11.525710344,11.041883772,12.022630835,12.260468809,11.806947596,12.523426304,13.452717008,12.440107257,10.034177548,10.882204524,9.8346794829,9.1350524379,8.8843705799,8.9086859688,10.573385907,11.685591445,10.718066337,10.857620115,10.516168609,10.180126813,1.6910308613,1.9068313341,3.1382602546,3.3517828398,1.2335616891,0.8378348583,2.7346506704,1.5824871423,-0.481991061,0.7020777112,-0.267004873,0.1330347442,-0.176803395,0.4410240579,0.6167808445,0.8378348583,1.2350035286,-0.043957976,0.8763473841,0.7459575682,1.7800324856,1.9511762489,-0.176803395,-1.764096231,-1.453840562,-3.792305148,-2.337685251,3.6485120225,0.8763473841,-5.61662169,1.5130276128,2.0842109931,-0.353606789,-1.323072174,-0.837059718,-2.95447029,-1.102681722,3.6045540463,1.7526947682,-4.870664122 +050,2,4,46,137,South Dakota,Ziebach County,2801,2801,2826,2840,2879,2855,2859,2838,2870,2747,2759,2801,2656,25,14,39,-24,4,-21,32,-123,12,42,-145,16,44,42,34,39,33,28,21,26,28,31,2,14,7,15,10,17,17,19,15,17,30,14,30,35,19,29,16,11,2,11,11,1,0,2,0,0,1,0,0,0,0,0,0,10,-17,4,-45,-26,-37,20,-123,1,30,-143,10,-15,4,-45,-25,-37,20,-123,1,30,-143,1,-1,0,2,0,0,1,-2,0,1,-3,0,0,0,0,0,0,0,0,0,0,0,0,15.531238969,14.687882497,11.859086153,13.650682534,11.58504476,9.8107918711,7.4773010504,9.4442426444,10.071942446,11.361553967,4.9417578539,2.4479804162,5.2319497733,3.5001750088,5.9680533614,5.9565522074,6.7651771408,5.4486015256,6.1151079137,10.995052226,10.589481115,12.239902081,6.6271363795,10.150507525,5.616991399,3.8542396636,0.7121239096,3.9956411188,3.9568345324,0.3665017409,0.7059654077,0,0,0.3500175009,0,0,0,0,0,0,-6.000705965,1.3988459521,-15.69584932,-9.100455023,-12.98929261,7.0077084793,-43.79562044,0.3632401017,10.791366906,-52.40974895,-5.294740558,1.3988459521,-15.69584932,-8.750437522,-12.98929261,7.0077084793,-43.79562044,0.3632401017,10.791366906,-52.40974895 +040,3,6,47,000,Tennessee,Tennessee,6346105,6346281,6355518,6400298,6455752,6496943,6544617,6595354,6651277,6714748,6778180,6830325,6886834,9237,44780,55454,41191,47674,50737,55923,63471,63432,52145,56509,19682,78628,80323,80252,80448,81883,81477,80297,81500,80559,80474,14301,60184,60654,63481,63582,66114,66665,69118,70923,69815,73874,5381,18444,19669,16771,16866,15769,14812,11179,10577,10744,6600,1190,9350,8627,10586,8250,10702,8066,9540,10424,3777,3280,2835,16969,26758,13411,22183,24170,32993,42680,42418,37685,46732,4025,26319,35385,23997,30433,34872,41059,52220,52842,41462,50012,-169,17,400,423,375,96,52,72,13,-61,-103,153628,153629,155068,156380,155105,154335,154938,155839,159332,160642,158279,156810,12.328180338,12.495751028,12.391552492,12.337174387,12.463193412,12.301542936,12.0150905,12.080402415,11.83950772,11.733333411,9.4363230075,9.4358687155,9.8019755734,9.7506739991,10.063035908,10.065200729,10.342341871,10.512618166,10.260495183,10.771035023,2.89185733,3.0598823122,2.5895769182,2.586500388,2.4001575042,2.2363422066,1.6727486295,1.5677842496,1.5790125366,0.9622983885,1.4659979416,1.3420918556,1.634563309,1.2651860667,1.6289229253,1.2178190817,1.4274999486,1.5451057028,0.5550940386,0.4782331385,2.6605902751,4.1627093859,2.070765968,3.4018936385,3.678851346,4.9813420484,6.386341489,6.2874418362,5.5384481984,6.8136558015,4.1265882167,5.5048012414,3.705329277,4.6670797052,5.3077742713,6.1991611301,7.8138414375,7.832547539,6.093542237,7.29188894 +050,3,6,47,001,Tennessee,Anderson County,75129,75072,75088,75212,75240,75323,75191,75500,75567,76113,76337,76991,77558,16,124,28,83,-132,309,67,546,224,654,567,217,811,803,824,763,819,780,777,809,822,812,194,876,934,924,933,951,945,987,1042,1013,1000,23,-65,-131,-100,-170,-132,-165,-210,-233,-191,-188,10,49,39,67,57,62,44,47,55,15,14,-5,144,132,124,-4,385,192,713,404,832,744,5,193,171,191,53,447,236,760,459,847,758,-12,-4,-12,-8,-15,-6,-4,-4,-2,-2,-3,1183,1183,1220,1218,1216,1205,1183,1183,1184,1148,1261,1226,10.791749834,10.674500837,10.94558424,10.138591759,10.869925875,10.326543851,10.245253165,10.613315841,10.722112073,10.507994228,11.656686627,12.415920028,12.273931842,12.397517839,12.62185532,12.511005051,13.014240506,13.670055756,13.213503078,12.940879592,-0.864936793,-1.74141919,-1.328347602,-2.25892608,-1.751929445,-2.184461199,-2.768987342,-3.056739915,-2.491391005,-2.432885363,0.6520292748,0.5184377742,0.8899928933,0.7574046268,0.8228759515,0.5825229865,0.6197257384,0.7215480485,0.1956589794,0.1811723143,1.9161676647,1.7547124664,1.6471510265,-0.053151202,5.1097942147,2.5419184865,9.401371308,5.3000983929,10.852551393,9.6280144161,2.5681969395,2.2731502406,2.5371439198,0.7042534249,5.9326701661,3.124441473,10.021097046,6.0216464415,11.048210373,9.8091867304 +050,3,6,47,003,Tennessee,Bedford County,45058,45058,45082,45249,45254,45567,46257,46954,47454,48214,49153,49684,50179,24,167,5,313,690,697,500,760,939,531,495,162,613,600,639,590,627,608,654,687,676,680,128,437,426,480,433,487,495,521,542,465,503,34,176,174,159,157,140,113,133,145,211,177,9,98,59,43,30,85,76,81,82,41,34,-14,-105,-229,117,494,472,310,546,713,278,283,-5,-7,-170,160,524,557,386,627,795,319,317,-5,-2,1,-6,9,0,1,0,-1,1,1,545,545,550,526,502,518,540,522,545,527,544,524,13.572306296,13.259228976,14.071635415,12.850670849,13.453347781,12.880264384,13.672283313,14.111557304,13.679087791,13.618657561,9.6755266741,9.4140525728,10.570242565,9.431085555,10.449410477,10.486399458,10.89183426,11.133135457,9.4094316906,10.073801108,3.8967796216,3.845176403,3.5013928497,3.4195852936,3.0039373035,2.3938649267,2.780449053,2.9784218472,4.2696561004,3.5448564533,2.1697977439,1.3038241826,0.9469175631,0.6534239415,1.8238190771,1.610033048,1.6933561902,1.6843489067,0.8296488157,0.680932878,-2.324783297,-5.060605726,2.5764966252,10.759714236,10.127560052,6.5672400644,11.41447506,14.645619152,5.6254236774,5.6677648378,-0.154985553,-3.756781543,3.5234141883,11.413138177,11.951379129,8.1772731124,13.10783125,16.329968059,6.4550724931,6.3486977159 +050,3,6,47,005,Tennessee,Benton County,16489,16491,16510,16531,16447,16363,16201,16224,16094,15989,16253,16199,16131,19,21,-84,-84,-162,23,-130,-105,264,-54,-68,33,172,151,173,137,168,171,139,171,173,170,44,218,256,225,251,254,248,284,277,256,267,-11,-46,-105,-52,-114,-86,-77,-145,-106,-83,-97,0,2,1,5,0,5,-2,-1,-1,-1,-1,31,64,23,-37,-45,105,-51,43,372,30,30,31,66,24,-32,-45,110,-53,42,371,29,29,-1,1,-3,0,-3,-1,0,-2,-1,0,0,162,162,201,192,162,186,192,175,194,205,248,234,10.411307164,9.1576202317,10.545565376,8.4141997298,10.362374711,10.582338016,8.6650250912,10.607282427,10.661900653,10.516548098,13.195726522,15.52550185,13.715330692,15.415796585,15.66692367,15.347484374,17.704080042,17.182556913,15.777147788,16.517166718,-2.784419358,-6.367881618,-3.169765315,-7.001596855,-5.304548959,-4.765146358,-9.039054951,-6.575274487,-5.115247134,-6.00061862,0.1210617112,0.0606464916,0.3047851265,0,0.3084040093,-0.123770035,-0.06233831,-0.062030891,-0.061629484,-0.061862048,3.8739747586,1.3948693068,-2.255409936,-2.763788232,6.4764841943,-3.156135899,2.6805473304,23.075491595,1.8488845063,1.855861429,3.9950364698,1.4555157984,-1.95062481,-2.763788232,6.7848882035,-3.279905935,2.6182090204,23.013460703,1.7872550228,1.7939993814 +050,3,6,47,007,Tennessee,Bledsoe County,12876,12882,12892,13002,12936,13917,14514,14611,14741,14907,14847,15085,15223,10,110,-66,981,597,97,130,166,-60,238,138,30,130,131,101,119,138,127,121,115,127,118,15,131,126,121,138,141,135,144,175,134,166,15,-1,5,-20,-19,-3,-8,-23,-60,-7,-48,0,-1,-2,-1,0,22,19,25,22,21,18,-3,111,-70,959,587,78,120,163,-22,224,168,-3,110,-72,958,587,100,139,188,0,245,186,-2,1,1,43,29,0,-1,1,0,0,0,1101,1101,1184,1176,2110,2716,2660,2602,2732,2671,2717,2746,10.040936124,10.101010101,7.5224369717,8.3711441736,9.4763948498,8.6535840829,8.1624392876,7.7300531021,8.4859013765,7.7867229774,10.118174094,9.7154753643,9.0120284512,9.7077134114,9.6824034335,9.1986917416,9.7139773341,11.763124286,8.953628224,10.954203511,-0.07723797,0.3855347367,-1.48959148,-1.336569238,-0.206008584,-0.545107659,-1.551538046,-4.033071184,-0.467726848,-3.167480533,-0.07723797,-0.154213895,-0.074479574,0,1.5107296137,1.2946306896,1.6864543983,1.4787927674,1.4031805426,1.1878051999,8.5734146907,-5.397486314,71.425911444,41.292954873,5.356223176,8.1766148814,10.995682677,-1.478792767,14.967259121,11.086181866,8.4961767205,-5.551700208,71.35143187,41.292954873,6.8669527897,9.471245571,12.682137075,0,16.370439663,12.273987066 +050,3,6,47,009,Tennessee,Blount County,123010,123101,123208,123689,124062,124937,125932,127047,128356,130106,131595,133396,134751,107,481,373,875,995,1115,1309,1750,1489,1801,1355,298,1242,1305,1274,1281,1300,1227,1239,1257,1283,1283,259,1258,1264,1364,1339,1357,1345,1434,1473,1503,1541,39,-16,41,-90,-58,-57,-118,-195,-216,-220,-258,11,88,59,52,50,84,66,91,88,35,37,72,414,299,908,1001,1087,1360,1850,1622,1990,1579,83,502,358,960,1051,1171,1426,1941,1710,2025,1616,-15,-5,-26,5,2,1,1,4,-5,-4,-3,2027,2027,1981,2069,2041,1961,2081,2023,2187,2135,2094,2024,10.060875588,10.534770798,10.232972823,10.212501345,10.277532918,9.6083444595,9.5874828795,9.6063828568,9.6833477363,9.5693779904,10.190484291,10.203793325,10.955867293,10.674894068,10.728163207,10.532374326,11.096408756,11.257121677,11.343781487,11.493695622,-0.129608703,0.3309774734,-0.722894469,-0.462392723,-0.450630289,-0.924029867,-1.508925877,-1.65073882,-1.660433751,-1.924317632,0.7128478677,0.4762846568,0.4176723601,0.3986144163,0.6640867424,0.5168302643,0.7041654092,0.6725232231,0.2641599149,0.2759680325,3.3536251959,2.4137137691,7.2932019807,7.9802606141,8.5935986782,10.64983575,14.315450627,12.395825771,15.019378017,11.77712225,4.0664730637,2.8899984258,7.7108743409,8.3788750304,9.2576854205,11.166666014,15.019616036,13.068348994,15.283537931,12.053090283 +050,3,6,47,011,Tennessee,Bradley County,98963,98926,99086,99813,101077,101819,102830,103846,104469,105575,107271,108233,109071,160,727,1264,742,1011,1016,623,1106,1696,962,838,298,1092,1199,1180,1226,1204,1149,1230,1262,1228,1224,195,952,940,954,970,1093,997,1110,1109,1139,1199,103,140,259,226,256,111,152,120,153,89,25,9,111,90,126,83,147,154,177,239,61,51,55,478,896,396,682,761,321,810,1302,815,759,64,589,986,522,765,908,475,987,1541,876,810,-7,-2,19,-6,-10,-3,-4,-1,2,-3,3,2744,2744,2684,2738,2767,2683,2720,2757,2790,2860,2605,2532,10.980447363,11.93688088,11.631574797,11.981490259,11.651086725,11.031370761,11.711831807,11.858338893,11.396540203,11.265324154,9.5726977008,9.3583553188,9.4038325053,9.4796456372,10.576941687,9.5720423397,10.569214069,10.42067974,10.570569456,11.035231749,1.4077496619,2.5785255613,2.2277422916,2.5018446218,1.0741450386,1.4593284209,1.1426177372,1.4376591526,0.8259707476,0.2300924051,1.1161443748,0.8960127433,1.2420156139,0.811144936,1.4225164025,1.4785301106,1.6853611624,2.2457551469,0.5661147821,0.4693885064,4.8064595599,8.9203046443,3.9034776437,6.6650704377,7.364183553,3.0818712047,7.7126697263,12.234197495,7.5636647116,6.9856054191,5.9226039347,9.8163173876,5.1454932576,7.4762153736,8.7866999555,4.5604013153,9.3980308888,14.479952642,8.1297794937,7.4549939256 +050,3,6,47,013,Tennessee,Campbell County,40716,40722,40735,40697,40545,40262,39918,39805,39829,39824,39820,39778,39837,13,-38,-152,-283,-344,-113,24,-5,-4,-42,59,105,402,430,428,419,418,449,452,450,437,441,94,532,477,552,579,590,594,619,615,598,628,11,-130,-47,-124,-160,-172,-145,-167,-165,-161,-187,0,-6,-7,-4,-4,13,13,17,20,8,9,7,100,-91,-150,-177,49,158,147,142,112,237,7,94,-98,-154,-181,62,171,164,162,120,246,-5,-2,-7,-5,-3,-3,-2,-2,-1,-1,0,519,519,633,569,543,519,591,612,626,653,653,683,9.873268494,10.585657665,10.593141683,10.451484161,10.486308844,11.276590401,11.349227273,11.300286274,10.980175381,11.078314388,13.066116514,11.742694665,13.662182732,14.442504365,14.801249326,14.918250998,15.542415226,15.443724574,15.025503153,15.775921623,-3.19284802,-1.157037001,-3.069041048,-3.991020205,-4.314940481,-3.641660597,-4.193187953,-4.1434383,-4.045327772,-4.697607235,-0.147362216,-0.17232466,-0.099001324,-0.099775505,0.3261292224,0.3264937087,0.4268514682,0.5022349455,0.2010100756,0.2260880487,2.4560369388,-2.240220576,-3.712549655,-4.415066101,1.2292562999,3.9681543059,3.6910097548,3.5658681131,2.8141410588,5.95365195,2.3086747225,-2.412545235,-3.811550979,-4.514841606,1.5553855224,4.2946480147,4.1178612231,4.0681030586,3.0151511345,6.1797399987 +050,3,6,47,015,Tennessee,Cannon County,13801,13813,13796,13725,13792,13704,13581,13746,13884,14162,14395,14583,14847,-17,-71,67,-88,-123,165,138,278,233,188,264,36,149,145,136,139,166,166,154,194,166,166,50,156,162,172,181,193,173,177,196,165,158,-14,-7,-17,-36,-42,-27,-7,-23,-2,1,8,1,12,8,20,7,5,2,5,9,2,2,-2,-76,76,-70,-91,186,143,296,224,186,254,-1,-64,84,-50,-84,191,145,301,233,188,256,-2,0,0,-2,3,1,0,0,2,-1,0,164,164,164,150,159,126,159,141,163,162,152,150,10.828094909,10.538939565,9.8923479779,10.188748397,12.149156512,12.01592472,10.981958212,13.586861365,11.456967355,11.281005776,11.336797355,11.774539376,12.510910678,13.26736302,14.125224137,12.52262034,12.622120802,13.726932101,11.387949479,10.737342847,-0.508702445,-1.235599811,-2.6185627,-3.078614623,-1.976067625,-0.506695621,-1.64016259,-0.140070736,0.0690178756,0.543662929,0.872061335,0.5814587346,1.4547570556,0.5131024372,0.3659384492,0.1447701773,0.3565570848,0.6303183107,0.1380357513,0.1359157322,-5.523055122,5.5238579787,-5.091649695,-6.670331684,13.612910308,10.35106768,21.10817942,15.687922401,12.837324867,17.261297995,-4.650993787,6.1053167133,-3.636892639,-6.157229247,13.978848758,10.495837857,21.464736504,16.318240712,12.975360618,17.397213727 +050,3,6,47,017,Tennessee,Carroll County,28522,28486,28453,28548,28670,28614,28417,27986,27956,27824,27937,27710,27779,-33,95,122,-56,-197,-431,-30,-132,113,-227,69,66,330,323,324,316,290,356,273,300,300,299,110,409,404,398,385,483,431,425,437,389,408,-44,-79,-81,-74,-69,-193,-75,-152,-137,-89,-109,1,2,4,6,5,5,1,4,1,3,4,13,172,194,18,-131,-244,47,17,249,-140,174,14,174,198,24,-126,-239,48,21,250,-137,178,-3,0,5,-6,-2,1,-3,-1,0,-1,0,974,974,1129,1300,1335,1281,1258,1287,1210,1324,1202,1212,11.578744233,11.290153448,11.312059214,11.081692413,10.283140968,12.727467734,9.7884546432,10.760208748,10.782252413,10.776910739,14.350625428,14.121430319,13.895677676,13.501429047,17.126748577,15.408816274,15.238436716,15.67403741,13.980987295,14.70561733,-2.771881195,-2.831276871,-2.583618462,-2.419736634,-6.84360761,-2.68134854,-5.449982072,-4.913828662,-3.198734882,-3.92870659,0.0701742075,0.1398161418,0.209482578,0.1753432344,0.1772955339,0.0357513139,0.1434205809,0.0358673625,0.1078225241,0.1441727189,6.0349818424,6.781082876,0.6284477341,-4.593992741,-8.652022056,1.6803117515,0.6095374686,8.9309732609,-5.031717793,6.2715132729,6.1051560499,6.9208990178,0.8379303121,-4.418649506,-8.474726522,1.7160630653,0.7529580495,8.9668406234,-4.923895268,6.4156859918 +050,3,6,47,019,Tennessee,Carter County,57424,57383,57343,57387,57355,56985,56334,56385,56481,56526,56437,56396,56418,-40,44,-32,-370,-651,51,96,45,-89,-41,22,129,584,520,506,539,533,506,479,481,467,451,135,578,656,719,678,690,716,730,775,782,835,-6,6,-136,-213,-139,-157,-210,-251,-294,-315,-384,2,17,18,10,2,1,3,3,6,-3,-1,-27,24,100,-164,-519,214,306,295,201,277,407,-25,41,118,-154,-517,215,309,298,207,274,406,-9,-3,-14,-3,5,-7,-3,-2,-2,0,0,1491,1491,1518,1520,1236,987,914,914,956,991,1011,1045,10.180423603,9.0638127277,8.850795872,9.5129678165,9.4571456454,8.9663849166,8.4773509606,8.5160627816,8.2777201705,7.9954615562,10.07583021,11.434348364,12.57652615,11.966219257,12.24283395,12.687611858,12.919553656,13.721306977,13.861193091,14.803127271,0.1045933932,-2.370535636,-3.725730278,-2.453251441,-2.785688305,-3.721226942,-4.442202695,-5.205244195,-5.58347292,-6.807665715,0.2963479474,0.3137473637,0.1749169145,0.0352985819,0.0177432376,0.0531603849,0.0530940561,0.1062294734,-0.053175933,-0.017728296,0.4183735727,1.7430409092,-2.868637397,-9.159981998,3.7970528482,5.4223592579,5.2209155185,3.5586873578,4.9099111076,7.2154165263,0.7147215201,2.0567882728,-2.693720483,-9.124683416,3.8147960858,5.4755196428,5.2740095746,3.6649168312,4.856735175,7.1976882302 +050,3,6,47,021,Tennessee,Cheatham County,39105,39101,39120,38978,39226,39335,39611,39597,39793,40436,40539,40828,41101,19,-142,248,109,276,-14,196,643,103,289,273,102,415,448,413,455,461,460,489,423,496,466,57,369,351,397,335,384,420,422,480,409,452,45,46,97,16,120,77,40,67,-57,87,14,3,5,2,4,6,5,19,39,25,30,24,-28,-194,154,93,156,-91,139,534,135,172,233,-25,-189,156,97,162,-86,158,573,160,202,257,-1,1,-5,-4,-6,-5,-2,3,0,0,2,283,283,283,283,279,279,297,313,327,360,318,289,10.627672924,11.457214465,10.514122784,11.526866466,11.64023836,11.588361255,12.190105822,10.447669034,12.191674758,11.375703353,9.4496658045,8.97652294,10.106795993,8.4868137714,9.695990304,10.580677667,10.519886824,11.85551096,10.053215677,11.033944025,1.1780071193,2.4806915247,0.4073267906,3.0400526942,1.9442480558,1.0076835874,1.6702189981,-1.407841927,2.1384590805,0.3417593282,0.1280442521,0.0511482789,0.1018316977,0.1520026347,0.1262498738,0.478649704,0.9722170288,0.6174745292,0.7373996829,0.5858731341,-4.968116981,3.9384174723,2.3675869706,3.9520685025,-2.297747702,3.5017004661,13.311894701,3.3343624575,4.2277581821,5.6878516765,-4.840072729,3.9895657511,2.4694186683,4.1040711372,-2.171497829,3.98035017,14.28411173,3.9518369867,4.965157865,6.2737248105 +050,3,6,47,023,Tennessee,Chester County,17131,17145,17194,17150,17080,17120,17141,17130,17132,17153,17279,17306,17432,49,-44,-70,40,21,-11,2,21,126,27,126,44,180,182,205,201,195,171,188,182,175,178,19,189,166,178,198,204,176,184,181,197,181,25,-9,16,27,3,-9,-5,4,1,-22,-3,0,9,-1,5,16,13,2,4,5,-4,0,27,-43,-90,11,3,-16,6,14,121,53,130,27,-34,-91,16,19,-3,8,18,126,49,130,-3,-1,5,-3,-1,1,-1,-1,-1,0,-1,1262,1262,1263,1212,1146,1170,1112,1102,1129,1116,1138,1140,10.482180294,10.63394683,11.988304094,11.733457868,11.379883867,9.9819041504,10.966895144,10.571561338,10.119994217,10.248143244,11.006289308,9.6990943617,10.409356725,11.558331631,11.905109276,10.273772693,10.733556949,10.513475836,11.392222062,10.420864759,-0.524109015,0.9348524686,1.5789473684,0.1751262368,-0.525225409,-0.291868542,0.2333381945,0.0580855019,-1.272227844,-0.172721515,0.5241090147,-0.058428279,0.2923976608,0.9340065964,0.7586589245,0.116747417,0.2333381945,0.2904275093,-0.231314154,0,-2.504076403,-5.258545136,0.6432748538,0.1751262368,-0.933734061,0.3502422509,0.8166836809,7.0283457249,3.0649125343,7.4845989982,-1.979967389,-5.316973415,0.9356725146,1.1091328333,-0.175075136,0.4669896679,1.0500218755,7.3187732342,2.8335983808,7.4845989982 +050,3,6,47,025,Tennessee,Claiborne County,32213,32209,32213,32112,31774,31645,31597,31585,31672,31700,31823,31919,32023,4,-101,-338,-129,-48,-12,87,28,123,96,104,81,320,315,287,313,325,292,308,342,333,330,115,386,439,424,430,429,455,435,454,406,456,-34,-66,-124,-137,-117,-104,-163,-127,-112,-73,-126,1,17,15,15,12,15,18,19,23,0,4,39,-50,-230,-3,64,79,231,138,213,168,226,40,-33,-215,12,76,94,249,157,236,168,230,-2,-2,1,-4,-7,-2,1,-2,-1,1,0,1257,1257,1271,1268,1265,1288,1268,1278,1247,1276,1291,1263,9.9494753206,9.8613154682,9.0509153408,9.8984851839,10.287740179,9.2321798378,9.7203812409,10.767753412,10.448369992,10.32185418,12.001554606,13.743230129,13.371387124,13.59855792,13.579817036,14.385759679,13.728460519,14.294035231,12.738853503,14.262925776,-2.052079285,-3.88191466,-4.320471783,-3.700072736,-3.292076857,-5.153579841,-4.008079278,-3.526281819,-2.290483512,-3.941071596,0.5285658764,0.4695864509,0.4730443558,0.3794946396,0.4748187775,0.5691069763,0.5996339077,0.7241471593,0,0.125113384,-1.554605519,-7.20032558,-0.094608871,2.0239714114,2.5007122282,7.3035395292,4.3552357508,6.7062323883,5.2712497255,7.0689061962,-1.026039642,-6.730739129,0.3784354846,2.403466051,2.9755310057,7.8726465055,4.9548696585,7.4303795476,5.2712497255,7.1940195802 +050,3,6,47,027,Tennessee,Clay County,7861,7856,7847,7744,7706,7693,7626,7668,7660,7661,7654,7597,7629,-9,-103,-38,-13,-67,42,-8,1,-7,-57,32,18,76,81,99,63,83,76,75,55,70,65,39,109,124,107,109,107,133,120,113,99,113,-21,-33,-43,-8,-46,-24,-57,-45,-58,-29,-48,0,1,2,6,7,4,0,0,0,0,0,12,-71,5,-12,-28,63,50,45,52,-28,81,12,-70,7,-6,-21,67,50,45,52,-28,81,0,0,-2,1,0,-1,-1,1,-1,0,-1,96,96,76,79,79,76,76,76,76,76,76,76,9.7492142903,10.485436893,12.857977791,8.2250799661,10.853929646,9.9164926931,9.7904836499,7.1825008162,9.1797259196,8.538027059,13.982425758,16.051779935,13.897006299,14.23069391,13.992415326,17.353862213,15.66477384,14.756774404,12.982755229,14.843031656,-4.233211468,-5.566343042,-1.039028508,-6.005613943,-3.138485681,-7.43736952,-5.87429019,-7.574273588,-3.80302931,-6.305004597,0.1282791354,0.2588996764,0.7792713813,0.913897774,0.5230809468,0,0,0,0,0,-9.107818613,0.6472491909,-1.558542763,-3.655591096,8.2385249117,6.5240083507,5.8742901899,6.7907280444,-3.671890368,10.639695258,-8.979539478,0.9061488673,-0.779271381,-2.741693322,8.7616058585,6.5240083507,5.8742901899,6.7907280444,-3.671890368,10.639695258 +050,3,6,47,029,Tennessee,Cocke County,35662,35642,35641,35434,35535,35409,35279,35157,35243,35564,35937,36017,36225,-1,-207,101,-126,-130,-122,86,321,373,80,208,98,357,396,404,373,415,364,370,362,362,351,103,427,462,505,525,519,517,524,527,558,558,-5,-70,-66,-101,-152,-104,-153,-154,-165,-196,-207,7,6,3,3,2,-4,-3,2,3,1,1,4,-142,166,-21,26,-9,243,472,533,275,416,11,-136,169,-18,28,-13,240,474,536,276,417,-7,-1,-2,-7,-6,-5,-1,1,2,0,-2,294,294,317,365,365,351,360,379,353,422,372,388,10.045726345,11.159802167,11.389264772,10.553417836,11.783746948,10.340909091,10.450944116,10.125732507,10.061984045,9.7173389441,12.015476609,13.019769195,14.236580965,14.854006338,14.736782327,14.6875,14.800796531,14.741052573,15.509909109,15.448077296,-1.969750264,-1.859967028,-2.847316193,-4.300588502,-2.95303538,-4.346590909,-4.349852416,-4.615320065,-5.447925063,-5.730738352,0.1688357369,0.0845439558,0.0845737483,0.0565866908,-0.113578284,-0.085227273,0.0564915898,0.0839149103,0.027795536,0.0276847263,-3.995779107,4.6780988882,-0.592016238,0.7356269805,-0.255551139,6.9034090909,13.332015196,14.908882393,7.6437724102,11.516846156,-3.82694337,4.7626428441,-0.50744249,0.7922136713,-0.369129422,6.8181818182,13.388506786,14.992797304,7.6715679462,11.544530882 +050,3,6,47,031,Tennessee,Coffee County,52796,52803,52770,52929,53165,53325,53555,54130,54593,55128,56049,56717,57632,-33,159,236,160,230,575,463,535,921,668,915,159,642,635,654,651,728,695,650,724,694,703,172,634,652,650,636,652,706,683,701,689,685,-13,8,-17,4,15,76,-11,-33,23,5,18,2,14,10,-7,-21,-12,2,39,22,18,13,-17,139,249,171,242,510,473,529,875,647,887,-15,153,259,164,221,498,475,568,897,665,900,-5,-2,-6,-8,-6,1,-1,0,1,-2,-3,557,557,557,557,557,565,557,692,647,716,616,603,12.147702438,11.970516712,12.282843459,12.181886228,13.520917491,12.784783349,11.848233246,13.024276604,12.308674601,12.295691261,11.996329199,12.290987238,12.207719035,11.901197605,12.109393137,12.987132437,12.449758934,12.61052196,12.219995389,11.980865596,0.1513732391,-0.320470526,0.0751244248,0.2806886228,1.4115243534,-0.202349089,-0.601525688,0.4137546435,0.0886792118,0.3148256653,0.2649031684,0.1885120742,-0.131467743,-0.392964072,-0.222872266,0.0367907434,0.7108939948,0.3957653112,0.3192451625,0.2273740916,2.6301100294,4.6939506475,3.2115691614,4.5284431138,9.4720713191,8.7010108257,9.6426390572,15.740665785,11.475090009,15.513909173,2.8950131979,4.8824627217,3.080101418,4.1354790419,9.2491990528,8.7378015691,10.353533052,16.136431096,11.794335172,15.741283264 +050,3,6,47,033,Tennessee,Crockett County,14586,14575,14589,14563,14612,14613,14654,14588,14464,14443,14276,14189,14180,14,-26,49,1,41,-66,-124,-21,-167,-87,-9,49,179,172,182,179,165,168,153,161,153,165,25,176,190,163,183,181,177,208,195,185,185,24,3,-18,19,-4,-16,-9,-55,-34,-32,-20,0,6,4,8,12,4,8,13,3,10,9,-10,-35,65,-26,38,-54,-122,22,-137,-64,3,-10,-29,69,-18,50,-50,-114,35,-134,-54,12,0,0,-2,0,-5,0,-1,-1,1,-1,-1,194,194,194,194,194,194,194,194,194,194,194,194,12.280461032,11.790916881,12.45508982,12.232206922,11.285137815,11.565468815,10.585671291,11.212089557,10.750043914,11.632415665,12.074643249,13.024850043,11.154833191,12.505552329,12.37945421,12.185047501,14.390977964,13.579860023,12.998419111,13.042405443,0.2058177827,-1.233933162,1.3002566296,-0.273345406,-1.094316394,-0.619578686,-3.805306673,-2.367770466,-2.248375198,-1.409989778,0.4116355653,0.2742073693,0.5474764756,0.8200362183,0.2735790986,0.5507366102,0.8994361227,0.2089209234,0.7026172493,0.6344953999,-2.401207464,4.4558697515,-1.779298546,2.5967813578,-3.693317831,-8.398733306,1.5221226692,-9.54072217,-4.496750395,0.2114984666,-1.989571899,4.7300771208,-1.23182207,3.4168175761,-3.419738732,-7.847996696,2.421558792,-9.331801247,-3.794133146,0.8459938665 +050,3,6,47,035,Tennessee,Cumberland County,56053,56058,56193,56538,57008,57462,57952,58259,58599,59077,59971,60832,61603,135,345,470,454,490,307,340,478,894,861,771,138,580,555,579,523,570,519,522,546,544,547,181,705,745,805,788,833,827,837,847,875,926,-43,-125,-190,-226,-265,-263,-308,-315,-301,-331,-379,4,30,31,41,31,42,23,39,23,29,25,168,441,613,629,711,526,626,753,1170,1167,1131,172,471,644,670,742,568,649,792,1193,1196,1156,6,-1,16,10,13,2,-1,1,2,-4,-6,636,636,636,731,738,717,725,727,714,732,736,652,10.289982347,9.7757736952,10.116187647,9.0630252829,9.8097426233,8.8825754334,8.8718175329,9.1727706471,9.0063988477,8.9353534529,12.507650957,13.12243496,14.064820477,13.655189145,14.33599229,14.153930411,14.225500527,14.229554465,14.486395205,15.126393597,-2.217668609,-3.346661265,-3.94863283,-4.592163862,-4.526249667,-5.271354978,-5.353682994,-5.056783818,-5.479996358,-6.191040144,0.5322404662,0.5460342064,0.7163448939,0.5371965273,0.7228231407,0.3936401444,0.6628369421,0.3863987635,0.4801205268,0.4083799567,7.8239348538,10.797386081,10.989778981,12.320862287,9.0524993331,10.713857845,12.797851728,19.655937101,19.320712234,18.475109242,8.35617532,11.343420288,11.706123875,12.858058814,9.7753224738,11.107497989,13.460688671,20.042335865,19.800832761,18.883489198 +050,3,6,47,037,Tennessee,Davidson County,626681,626577,627794,636083,649619,660560,670102,680397,686420,687808,691298,692999,694176,1217,8289,13536,10941,9542,10295,6023,1388,3490,1701,1177,2415,9481,9711,9893,10021,10357,10165,10054,10082,9985,10034,1206,4937,4919,5121,5164,5146,5428,5445,5553,5526,5962,1209,4544,4792,4772,4857,5211,4737,4609,4529,4459,4072,363,3023,2458,3511,2909,3489,2635,3022,3402,1389,1079,-316,702,5986,2552,1677,1519,-1354,-6172,-4394,-4110,-3946,47,3725,8444,6063,4586,5008,1281,-3150,-992,-2721,-2867,-39,20,300,106,99,76,5,-71,-47,-37,-28,25870,25879,25960,26196,25609,25371,25867,25982,26064,25286,25470,25409,15.003042226,15.106144348,15.101753272,15.061676068,15.338034312,14.873973619,14.632215324,14.621066111,14.426094978,14.466812046,7.8124690931,7.6518508955,7.8172524518,7.761550266,7.6208867981,7.9425409546,7.924449218,8.0530430583,7.9838358387,8.595887325,7.1905731333,7.4542934521,7.2845008201,7.300125802,7.7171475136,6.9314326644,6.7077661058,6.5680230526,6.4422591395,5.8709247211,4.7836933499,3.8235920921,5.3595730049,4.3722598226,5.1669790203,3.8556734369,4.3981057001,4.9336309174,2.0067947846,1.5556797088,1.1108675923,9.3116445335,3.8956508996,2.5205499218,2.2495388741,-1.981245478,-8.98249781,-6.372244048,-5.938032084,-5.689260548,5.8945609422,13.135236626,9.2552239045,6.8928097443,7.4165178945,1.8744279593,-4.58439211,-1.438613131,-3.9312373,-4.133580839 +050,3,6,47,039,Tennessee,Decatur County,11757,11746,11713,11679,11631,11693,11681,11596,11728,11711,11669,11608,11601,-33,-34,-48,62,-12,-85,132,-17,-42,-61,-7,27,104,104,119,136,126,118,115,114,103,106,61,159,163,151,183,188,156,199,170,170,183,-34,-55,-59,-32,-47,-62,-38,-84,-56,-67,-77,0,14,10,19,6,7,2,2,2,0,0,3,7,5,73,30,-28,169,65,14,4,72,3,21,15,92,36,-21,171,67,16,4,72,-2,0,-4,2,-1,-2,-1,0,-2,2,-2,213,213,210,210,237,213,215,237,224,215,216,216,8.8919288646,8.9232089232,10.204081633,11.63686147,10.826137389,10.118333048,9.8127053202,9.751924722,8.8499377067,9.1343875221,13.594391245,13.985413985,12.948036357,15.65842389,16.153284358,13.376779283,16.980246598,14.542343884,14.606693302,15.769744496,-4.70246238,-5.062205062,-2.743954725,-4.02156242,-5.327146969,-3.258446236,-7.167541277,-4.790419162,-5.756755596,-6.635356974,1.1969904241,0.858000858,1.6292231178,0.5133909472,0.6014520772,0.1714971703,0.1706557447,0.1710863986,0,0,0.598495212,0.429000429,6.2596467158,2.566954736,-2.405808309,14.49151089,5.5463117027,1.1976047904,0.3436869012,6.2044896376,1.7954856361,1.287001287,7.8888698336,3.0803456832,-1.804356231,14.66300806,5.7169674474,1.3686911891,0.3436869012,6.2044896376 +050,3,6,47,041,Tennessee,DeKalb County,18723,18722,18694,18753,18865,19147,19218,19281,19414,19817,20045,20409,20837,-28,59,112,282,71,63,133,403,228,364,428,56,223,226,229,209,252,214,218,200,237,229,86,229,236,233,252,242,243,243,253,254,270,-30,-6,-10,-4,-43,10,-29,-25,-53,-17,-41,1,35,21,71,50,76,46,66,40,49,40,4,29,101,213,68,-21,116,360,240,333,431,5,64,122,284,118,55,162,426,280,382,471,-3,1,0,2,-4,-2,0,2,1,-1,-2,298,298,280,298,298,272,272,263,276,271,290,274,11.910166368,12.015524483,12.048826686,10.895347322,13.091249123,11.060860576,11.113660116,10.034619437,11.717011915,11.104107065,12.230619275,12.547184858,12.259286541,13.136973804,12.571755111,12.559762243,12.388162423,12.693793588,12.557472685,13.092178636,-0.320452907,-0.531660375,-0.210459855,-2.241626482,0.5194940128,-1.498901667,-1.274502307,-2.659174151,-0.84046077,-1.988071571,1.8693086229,1.1164867882,3.7356624224,2.6065424215,3.9481544975,2.3775681613,3.3646860901,2.0069238874,2.4225045731,1.9395820201,1.5488557161,5.3697697911,11.206987267,3.5448976932,-1.090937427,5.9956066675,18.352833219,12.041543324,16.463143323,20.898996266,3.4181643389,6.4862565793,14.94264969,6.1514401147,2.8572170706,8.3731748288,21.717519309,14.048467212,18.885647896,22.838578286 +050,3,6,47,043,Tennessee,Dickson County,49666,49658,49692,49996,50229,50182,50484,51357,51936,52811,53467,53856,54376,34,304,233,-47,302,873,579,875,656,389,520,157,599,569,641,621,627,608,574,641,647,638,150,494,504,472,527,512,599,595,596,590,575,7,105,65,169,94,115,9,-21,45,57,63,1,3,5,-1,-2,0,-6,1,-8,-2,1,32,196,166,-214,217,753,575,891,619,333,453,33,199,171,-215,215,753,569,892,611,331,454,-6,0,-3,-1,-7,5,1,4,0,1,3,617,617,673,716,646,606,625,617,645,673,720,683,12.017494583,11.354452482,12.76752547,12.337830052,12.313311927,11.772336944,10.95974109,12.062703476,12.057061394,11.789489245,9.9109220769,10.057370915,9.4013604087,10.470268015,10.054889485,11.598075378,11.360707228,11.215867818,10.99484733,10.625323379,2.1065725062,1.2970815665,3.3661650616,1.8675620368,2.2584224428,0.1742615666,-0.400966137,0.8468356574,1.0622140641,1.1641658659,0.0601877859,0.0997755051,-0.019918136,-0.039735362,0,-0.116174378,0.0190936256,-0.150548561,-0.037270669,0.0184788233,3.9322686783,3.3125467698,-4.262481202,4.3112868297,14.787757387,11.133377867,17.012420403,11.648694932,6.2055663744,8.3709069406,3.9924564642,3.4123222749,-4.282399339,4.2715514672,14.787757387,11.017203489,17.031514029,11.498146371,6.1682957055,8.3893857639 +050,3,6,47,045,Tennessee,Dyer County,38335,38331,38320,38122,38196,38112,37835,37784,37588,37368,37233,37122,36693,-11,-198,74,-84,-277,-51,-196,-220,-135,-111,-429,117,475,519,479,466,445,491,466,450,456,451,106,441,411,445,438,425,454,527,495,463,499,11,34,108,34,28,20,37,-61,-45,-7,-48,3,18,19,26,13,3,-4,-2,-2,-3,-1,-21,-251,-50,-142,-320,-74,-227,-157,-87,-102,-379,-18,-233,-31,-116,-307,-71,-231,-159,-89,-105,-380,-4,1,-3,-2,2,0,-2,0,-1,1,-1,516,516,516,516,516,516,512,517,525,576,547,517,12.42772298,13.600985351,12.554384861,12.271715802,11.769528822,13.028710927,12.433961257,12.064181445,12.265483155,12.219738536,11.53815965,10.770722503,11.663259422,11.534359488,11.240561235,12.046913973,14.061582795,13.27059959,12.453769081,13.520287204,0.8895633291,2.8302628476,0.891125439,0.7373563143,0.5289675875,0.9817969538,-1.627621538,-1.206418145,-0.188285926,-1.300548669,0.4709452919,0.4979166121,0.6814488651,0.3423440031,0.0793451381,-0.106140211,-0.053364641,-0.053618584,-0.080693968,-0.027094764,-6.567070459,-1.310306874,-3.721759186,-8.426929306,-1.957180074,-6.023456987,-4.189124286,-2.332408413,-2.743594916,-10.26891553,-6.096125167,-0.812390262,-3.040310321,-8.084585303,-1.877834936,-6.129597198,-4.242488927,-2.386026997,-2.824288884,-10.2960103 +050,3,6,47,047,Tennessee,Fayette County,38413,38439,38427,38574,38689,38819,39131,39291,39712,40156,40529,41044,41620,-12,147,115,130,312,160,421,444,373,515,576,105,447,417,422,443,416,417,416,407,391,393,136,322,302,331,396,408,423,438,419,428,477,-31,125,115,91,47,8,-6,-22,-12,-37,-84,1,5,7,20,25,28,21,18,13,8,6,18,18,-1,21,234,125,405,445,370,543,656,19,23,6,41,259,153,426,463,383,551,662,0,-1,-6,-2,6,-1,1,3,2,1,-2,421,421,420,433,408,510,482,525,526,504,469,442,11.610238828,10.794299988,10.889198534,11.366260423,10.609267808,10.556561143,10.417188361,10.088616224,9.5865053388,9.5083712378,8.3635277464,7.8174546678,8.5410538267,10.160359205,10.405243427,10.708454109,10.968097361,10.386069282,10.493668248,11.540694861,3.2467110817,2.9768453205,2.3481447076,1.2059012187,0.2040243809,-0.151892966,-0.550909,-0.297453058,-0.907162909,-2.032323623,0.1298684433,0.1811992804,0.5160757599,0.6414368185,0.7140853332,0.5316253813,0.4507437271,0.322240813,0.1961433317,0.1451659731,0.4675263958,-0.025885611,0.5418795479,6.0038486209,3.1878809518,10.252775211,11.143386588,9.1714692942,13.313228642,15.871479725,0.597394839,0.1553136689,1.0579553078,6.6452854394,3.901966285,10.784400592,11.594130315,9.4937101072,13.509371974,16.016645698 +050,3,6,47,049,Tennessee,Fentress County,17959,17962,17922,17999,17919,17909,17856,17974,18069,18240,18362,18568,18787,-40,77,-80,-10,-53,118,95,171,122,206,219,49,198,179,191,193,176,203,182,186,192,188,84,208,222,235,255,240,240,269,262,253,279,-35,-10,-43,-44,-62,-64,-37,-87,-76,-61,-91,0,-2,-2,-2,0,1,6,7,8,3,4,-4,90,-31,39,13,179,128,250,191,263,307,-4,88,-33,37,13,180,134,257,199,266,311,-1,-1,-4,-3,-4,2,-2,1,-1,1,-1,132,132,130,157,124,140,235,230,236,236,262,261,11.024191977,9.9671473913,10.662052026,10.792674402,9.8241696902,11.26432317,10.025062657,10.16337905,10.398050366,10.065586936,11.580969349,12.361490061,13.118231551,14.259751153,13.396595032,13.317426407,14.817262938,14.316157587,13.701597617,14.937759336,-0.556777373,-2.394342669,-2.456179524,-3.467076751,-3.572425342,-2.053103238,-4.792200281,-4.152778537,-3.303547252,-4.8721724,-0.111355475,-0.111364775,-0.111644524,0,0.055819146,0.3329356602,0.3855793329,0.4371345828,0.162469537,0.2141614242,5.0109963531,-1.726154017,2.1770682148,0.7269677059,9.9916271281,7.1026274173,13.770690462,10.436588165,14.24316274,16.436889305,4.8996408786,-1.837518793,2.065423691,0.7269677059,10.047446274,7.4355630774,14.156269795,10.873722747,14.405632277,16.651050729 +050,3,6,47,051,Tennessee,Franklin County,41052,41064,40960,40866,40706,41241,41320,41385,41579,41662,42016,42255,42485,-104,-94,-160,535,79,65,194,83,354,239,230,80,374,408,411,364,402,414,403,428,395,405,128,482,470,504,509,488,515,497,521,487,510,-48,-108,-62,-93,-145,-86,-101,-94,-93,-92,-105,0,3,23,69,41,52,22,37,39,27,22,-53,12,-114,549,185,104,274,139,409,306,313,-53,15,-91,618,226,156,296,176,448,333,335,-3,-1,-7,10,-2,-5,-1,1,-1,-2,0,1776,1776,1823,1797,1979,2013,2074,2115,2150,2182,2216,2200,9.1413487156,10.00343255,10.030873613,8.8177226536,9.7212985914,9.98023239,9.6827284631,10.229690002,9.3745179243,9.5586499882,11.781096473,11.523562007,12.300633336,12.330277007,11.800979385,12.415023384,11.941230884,12.452496475,11.557949947,12.036818504,-2.639747757,-1.520129456,-2.269759723,-3.512554354,-2.079680793,-2.434790994,-2.258502421,-2.222806472,-2.183432023,-2.478168515,0.0733263266,0.5639189918,1.6840152782,0.9932050242,1.2574814098,0.5303505135,0.8889849954,0.9321446497,0.6407898328,0.519235308,0.2933053064,-2.795076742,13.39890417,4.4815348651,2.5149628197,6.6052745769,3.339700388,9.7755682497,7.2622847717,7.3873023366,0.366631633,-2.23115775,15.082919448,5.4747398893,3.7724442295,7.1356250904,4.2286853834,10.707712899,7.9030746045,7.9065376446 +050,3,6,47,053,Tennessee,Gibson County,49683,49686,49733,49896,49668,49381,49437,49327,49252,49257,49181,49114,49159,47,163,-228,-287,56,-110,-75,5,-76,-67,45,153,585,641,619,600,631,609,591,596,568,559,126,712,655,671,630,678,712,694,682,665,703,27,-127,-14,-52,-30,-47,-103,-103,-86,-97,-144,0,3,8,5,6,6,8,8,6,4,3,27,287,-218,-240,91,-65,23,105,5,26,187,27,290,-210,-235,97,-59,31,113,11,30,190,-7,0,-4,0,-11,-4,-3,-5,-1,0,-1,991,991,1053,1033,1039,1051,1107,1123,1148,1165,1154,1144,11.74356864,12.87613997,12.498864199,12.143536603,12.77793528,12.355572688,11.998903653,12.109144842,11.557047663,11.376471666,14.293027131,13.157366116,13.548849559,12.750713433,13.729699081,14.445267248,14.09008314,13.856437555,13.530698408,14.307083329,-2.549458491,-0.281226146,-1.049985361,-0.60717683,-0.951763801,-2.08969456,-2.091179486,-1.747292712,-1.973650745,-2.930611663,0.0602234289,0.1607006549,0.1009601308,0.121435366,0.1215017618,0.1623063736,0.1624217077,0.1219041427,0.0813876596,0.0610544097,5.7613747001,-4.379092845,-4.846086281,1.8417697181,-1.316269086,0.466630824,2.1317849131,0.1015867856,0.5290197874,3.8057248685,5.8215981291,-4.21839219,-4.74512615,1.9632050841,-1.194767324,0.6289371976,2.2942066207,0.2234909283,0.610407447,3.8667792781 +050,3,6,47,055,Tennessee,Giles County,29485,29479,29409,29292,28978,28810,28829,28982,29167,29401,29434,29481,29530,-70,-117,-314,-168,19,153,185,234,33,47,49,73,286,284,315,300,342,336,325,292,324,304,45,359,347,383,369,330,357,382,429,382,418,28,-73,-63,-68,-69,12,-21,-57,-137,-58,-114,2,27,21,32,35,41,38,61,39,47,36,-103,-72,-276,-129,55,104,168,231,133,57,126,-101,-45,-255,-97,90,145,206,292,172,104,162,3,1,4,-3,-2,-4,0,-1,-2,1,1,678,678,643,694,692,682,697,724,709,688,681,660,9.7442973714,9.7477261026,10.901917353,10.409618487,11.831658335,11.556518599,11.098210627,9.9260644174,10.998896716,10.303163817,12.231478169,11.910073794,13.255347131,12.80383074,11.416512428,12.278801011,13.044666029,14.583156285,12.967835017,14.166850248,-2.487180798,-2.162347692,-2.353429778,-2.394212252,0.4151459065,-0.722282412,-1.946455402,-4.657091867,-1.968938301,-3.863686431,0.9199161854,0.7207825639,1.107496366,1.2144554902,1.4184151805,1.3069872225,2.0830487638,1.3257414804,1.595518968,1.2201115046,-2.453109828,-9.473142269,-4.464594726,1.908430056,3.5979311896,5.7782592994,7.8882666302,4.5211183819,1.9349910889,4.2703902662,-1.533193642,-8.752359705,-3.35709836,3.1228855462,5.0163463701,7.0852465219,9.9713153941,5.8468598623,3.5305100569,5.4905017709 +050,3,6,47,057,Tennessee,Grainger County,22657,22654,22718,22748,22682,22733,22857,22847,23092,23119,23160,23406,23565,64,30,-66,51,124,-10,245,27,41,246,159,70,203,228,213,236,223,223,229,234,242,237,76,237,238,284,299,283,279,301,310,290,316,-6,-34,-10,-71,-63,-60,-56,-72,-76,-48,-79,0,-2,2,6,-3,4,3,15,5,12,11,67,67,-56,116,191,48,298,86,114,282,228,67,65,-54,122,188,52,301,101,119,294,239,3,-1,-2,0,-1,-2,0,-2,-2,0,-1,151,151,151,151,151,151,151,151,151,151,151,151,8.9297497031,10.037420207,9.3801607398,10.35314762,9.7584456503,9.7085265243,9.9110601372,10.112578059,10.39384959,10.09133295,10.425372806,10.477657935,12.506880986,13.116911603,12.384036408,12.146542154,13.027201316,13.397005121,12.455439591,13.4551106,-1.495623103,-0.440237728,-3.126720247,-2.763763983,-2.625590758,-2.438015629,-3.116141179,-3.284427062,-2.061590001,-3.36377765,-0.08797783,0.0880475457,0.26422988,-0.131607809,0.1750393839,0.1306079801,0.6491960789,0.2160807278,0.5153975003,0.4683741032,2.9472572912,-2.465331279,5.1084443466,8.3790304891,2.1004726063,12.973726028,3.7220575188,4.9266405929,12.111841258,9.7081177748,2.8592794616,-2.377283733,5.3726742266,8.2474226804,2.2755119902,13.104334008,4.3712535976,5.1427213207,12.627238758,10.176491878 +050,3,6,47,059,Tennessee,Greene County,68831,68825,68834,69174,68773,68352,68491,68621,68582,68866,69237,69127,69571,9,340,-401,-421,139,130,-39,284,371,-110,444,169,566,633,617,658,634,679,673,659,667,652,171,852,842,836,857,878,925,998,989,955,1022,-2,-286,-209,-219,-199,-244,-246,-325,-330,-288,-370,3,41,20,16,3,23,15,19,16,9,9,19,583,-205,-212,344,357,197,593,685,172,809,22,624,-185,-196,347,380,212,612,701,181,818,-11,2,-7,-6,-9,-6,-5,-3,0,-3,-4,1752,1752,1818,1811,1774,1784,1848,1769,1885,1905,1729,1688,8.2024230479,9.1774377116,8.999088423,9.6168601975,9.247914114,9.8977427607,9.7927943659,9.5436015148,9.6412361597,9.4017217263,12.347110312,12.207586972,12.19325433,12.525302719,12.807048253,13.483670182,14.521855538,14.322643245,13.804168714,14.737054608,-4.144687265,-3.03014926,-3.194165907,-2.908442522,-3.559134139,-3.585927421,-4.729061172,-4.77904173,-4.162932555,-5.335332882,0.594168454,0.2899664364,0.2333637192,0.0438458672,0.3354921524,0.2186541111,0.2764681916,0.2317111142,0.1300916423,0.1297783674,8.4487855776,-2.972155973,-3.09206928,5.0276594345,5.2074216699,2.8716573253,8.6287177696,9.9201320753,2.4861958313,11.665633246,9.0429540317,-2.682189537,-2.858705561,5.0715053017,5.5429138223,3.0903114363,8.9051859612,10.15184319,2.6162874736,11.795411614 +050,3,6,47,061,Tennessee,Grundy County,13703,13726,13725,13588,13583,13449,13341,13339,13284,13336,13343,13409,13485,-1,-137,-5,-134,-108,-2,-55,52,7,66,76,36,157,165,147,155,159,160,156,181,143,157,40,178,222,212,202,205,207,224,229,167,191,-4,-21,-57,-65,-47,-46,-47,-68,-48,-24,-34,0,0,0,0,1,1,0,1,1,-1,0,3,-116,54,-67,-60,42,-8,121,53,91,110,3,-116,54,-67,-59,43,-8,122,54,90,110,0,0,-2,-2,-2,1,0,-2,1,0,0,180,180,180,171,180,145,180,190,190,198,218,195,11.496357046,12.145301976,10.875998816,11.571481896,11.91904048,12.01968223,11.720510894,13.568724465,10.690789474,11.675466647,13.034086333,16.34095175,15.685113939,15.080253826,15.367316342,15.550463885,16.82945154,17.167060235,12.485047847,14.203911653,-1.537729286,-4.195649774,-4.809115123,-3.50877193,-3.448275862,-3.530781655,-5.108940646,-3.59833577,-1.794258373,-2.528445006,0,0,0,0.0746547219,0.0749625187,0,0.0751314801,0.0749653285,-0.074760766,0,-8.494123677,3.9748261014,-4.957087896,-4.479283315,3.1484257871,-0.600984111,9.0909090909,3.9731624124,6.8032296651,8.1802632557,-8.494123677,3.9748261014,-4.957087896,-4.404628593,3.2233883058,-0.600984111,9.166040571,4.0481277409,6.7284688995,8.1802632557 +050,3,6,47,063,Tennessee,Hamblen County,62544,62534,62509,62900,62775,63068,63027,63379,63674,64084,64654,64873,65110,-25,391,-125,293,-41,352,295,410,570,219,237,171,795,765,803,784,801,734,730,815,776,778,211,675,670,752,797,755,747,814,759,755,821,-40,120,95,51,-13,46,-13,-84,56,21,-43,4,103,76,143,85,87,40,61,92,-1,14,18,168,-293,110,-96,227,270,436,423,199,264,22,271,-217,253,-11,314,310,497,515,198,278,-7,0,-3,-11,-17,-8,-2,-3,-1,0,2,918,918,981,977,918,954,918,991,1044,1078,1019,1002,12.678515896,12.174259001,12.76193352,12.435068797,12.673449045,11.554233273,11.42785579,12.661374264,11.982057795,11.970796181,10.764777648,10.662422916,11.95139976,12.64126254,11.945635492,11.758872282,12.742841936,11.791390266,11.657801076,12.632421163,1.9137382485,1.5118360851,0.8105337603,-0.206193743,0.7278135532,-0.204639009,-1.314986146,0.8699839985,0.3242567187,-0.661624982,1.6426253299,1.2094688681,2.2726730927,1.3481898569,1.3765169375,0.629658489,0.9549304153,1.4292594261,-0.015440796,0.2154127847,2.6792335478,-4.662820768,1.7482100713,-1.522661485,3.5916016645,4.2501948006,6.82540428,6.5714862744,3.0727184294,4.0620696553,4.3218588778,-3.4533519,4.0208831639,-0.174471629,4.968118602,4.8798532896,7.7803346953,8.0007457006,3.0572776332,4.27748244 +050,3,6,47,065,Tennessee,Hamilton County,336463,336477,337235,341179,345828,349234,350972,353985,358165,361362,364626,367776,371662,758,3944,4649,3406,1738,3013,4180,3197,3264,3150,3886,1074,4047,4118,4213,4097,4223,4371,4157,4276,4300,4290,834,3189,3331,3315,3359,3485,3420,3711,3774,3754,4042,240,858,787,898,738,738,951,446,502,546,248,60,662,410,520,400,413,321,406,481,144,119,455,2415,3358,1978,640,1870,2903,2336,2273,2451,3520,515,3077,3768,2498,1040,2283,3224,2742,2754,2595,3639,3,9,94,10,-40,-8,5,9,8,9,-1,9778,9779,9891,10028,10120,9984,9825,9710,10100,9989,9823,9945,11.930767938,11.988233017,12.122659561,11.702270475,11.980872592,12.275503756,11.554813092,11.779809033,11.742185303,11.603406912,9.4013390054,9.6971355459,9.5387174094,9.594319386,9.8871278674,9.6047181071,10.315109787,10.396866064,10.251200843,10.932627211,2.5294289328,2.2910974706,2.5839421519,2.1079510887,2.0937447249,2.6707856491,1.2397033051,1.3829429688,1.4909844594,0.6707797003,1.9516106684,1.1935831804,1.4962693976,1.1425209153,1.1717026712,0.9014954715,1.1285191522,1.3250907729,0.3932266706,0.3218660659,7.1195464716,9.7757373651,5.691578593,1.8280334644,5.305288124,8.1527768026,6.4931545307,6.26181149,6.6930456225,9.5207441327,9.07115714,10.969320545,7.1878479905,2.9705543797,6.4769907952,9.0542722741,7.6216736828,7.5869022628,7.0862722931,9.8426101986 +050,3,6,47,067,Tennessee,Hancock County,6819,6809,6796,6706,6656,6621,6619,6577,6596,6592,6552,6605,6493,-13,-90,-50,-35,-2,-42,19,-4,-40,53,-112,13,64,70,74,61,67,84,70,71,67,70,37,104,90,105,86,123,91,103,102,87,100,-24,-40,-20,-31,-25,-56,-7,-33,-31,-20,-30,0,0,0,1,1,1,1,1,1,1,1,12,-50,-28,-5,24,14,25,31,-11,72,-83,12,-50,-28,-4,25,15,26,32,-10,73,-82,-1,0,-2,0,-2,-1,0,-3,1,0,0,149,149,161,149,149,149,151,149,158,161,159,155,9.4800770256,10.477473432,11.147096483,9.2145015106,10.154592301,12.753359144,10.615711253,10.803408399,10.184692559,10.688654756,15.405125167,13.47103727,15.81682609,12.990936556,18.642012731,13.816139072,15.620260843,15.520389531,13.224899293,15.269506795,-5.925048141,-2.993563838,-4.669729608,-3.776435045,-8.48742043,-1.062779929,-5.004549591,-4.716981132,-3.040206734,-4.580852038,0,0,0.150636439,0.1510574018,0.1515610791,0.1518257041,0.1516530179,0.1521606817,0.1520103367,0.1526950679,-7.406310176,-4.190989373,-0.753182195,3.6253776435,2.1218551076,3.7956426023,4.7012435547,-1.673767498,10.944744243,-12.67369064,-7.406310176,-4.190989373,-0.602545756,3.7764350453,2.2734161867,3.9474683064,4.8528965726,-1.521606817,11.096754579,-12.52099557 +050,3,6,47,069,Tennessee,Hardeman County,27253,27245,27169,26874,26614,26362,25992,25823,25590,25491,25270,25049,24836,-76,-295,-260,-252,-370,-169,-233,-99,-221,-221,-213,58,289,276,264,264,290,263,245,238,217,216,44,280,299,264,304,287,293,338,311,298,306,14,9,-23,0,-40,3,-30,-93,-73,-81,-90,0,0,0,-1,-1,-1,0,0,0,0,0,-96,-305,-240,-254,-336,-171,-202,-6,-148,-141,-123,-96,-305,-240,-255,-337,-172,-202,-6,-148,-141,-123,6,1,3,3,7,0,-1,0,0,1,0,3825,3825,3849,3895,3901,3865,3897,3922,3898,3880,3856,3814,10.695187166,10.320071792,9.9667774086,10.085189288,11.193669787,10.23087546,9.592607819,9.3772778314,8.6249726743,8.659917811,10.362119053,11.180077774,9.9667774086,11.613248271,11.077873203,11.397895474,13.23388344,12.253501704,11.844432521,12.268216899,0.3330681124,-0.860005983,0,-1.528058983,0.115796584,-1.167020014,-3.641275621,-2.876223873,-3.219459846,-3.608299088,0,0,-0.037752945,-0.038201475,-0.038598861,0,0,0,0,0,-11.28730825,-8.973975471,-9.589247961,-12.83569546,-6.600405288,-7.857934764,-0.234921008,-5.831248399,-5.604244917,-4.931342087,-11.28730825,-8.973975471,-9.627000906,-12.87389693,-6.639004149,-7.857934764,-0.234921008,-5.831248399,-5.604244917,-4.931342087 +050,3,6,47,071,Tennessee,Hardin County,26026,26008,26050,25871,25966,25931,25808,25760,25746,25708,25659,25627,25583,42,-179,95,-35,-123,-48,-14,-38,-49,-32,-44,65,286,299,267,260,283,301,251,255,230,227,43,336,350,397,380,390,376,397,409,372,397,22,-50,-51,-130,-120,-107,-75,-146,-154,-142,-170,1,1,4,-1,20,23,15,0,-3,-1,-1,20,-130,148,99,-20,38,47,109,108,112,127,21,-129,152,98,0,61,62,109,105,111,126,-1,0,-6,-3,-3,-2,-1,-1,0,-1,0,371,371,371,371,371,371,371,371,371,371,371,371,11.016736966,11.536161429,10.289612116,10.050445505,10.975798945,11.687958684,9.7562871691,9.9285533514,8.9693093632,8.8654559656,12.942739932,13.503867894,15.299535619,14.689112662,15.125659324,14.600240749,15.431258989,15.924620866,14.50688297,15.504784222,-1.926002966,-1.967706464,-5.009923502,-4.638667156,-4.149860379,-2.912282064,-5.674971819,-5.996067514,-5.537573607,-6.639328256,0.0385200593,0.1543299188,-0.038537873,0.7731111927,0.8920260627,0.5824564128,0,-0.11680651,-0.038996997,-0.039054872,-5.007607712,5.710206995,3.8152494364,-0.773111193,1.4737821905,1.8250300936,4.2367940296,4.2050343606,4.3676636899,4.9599687561,-4.969087652,5.8645369138,3.7767115633,0,2.3658082532,2.4074865064,4.2367940296,4.0882278506,4.3286666927,4.920913884 +050,3,6,47,073,Tennessee,Hawkins County,56833,56826,56870,56632,56574,56719,56506,56397,56599,56671,56774,56855,56775,44,-238,-58,145,-213,-109,202,72,103,81,-80,129,551,533,568,520,557,549,523,541,517,527,125,635,683,642,707,733,717,739,739,752,842,4,-84,-150,-74,-187,-176,-168,-216,-198,-235,-315,2,-11,-7,3,2,15,19,38,38,26,19,43,-141,108,221,-14,57,354,251,266,289,215,45,-152,101,224,-12,72,373,289,304,315,234,-5,-2,-9,-5,-14,-5,-3,-1,-3,1,1,456,456,540,594,567,563,561,603,579,575,561,580,9.7090800162,9.416462025,10.027097879,9.1852506072,9.8668768766,9.7171581295,9.234572261,9.5376614218,9.0997896664,9.2757194403,11.189230146,12.066498242,11.333445138,12.488408037,12.984597398,12.690714716,13.048468262,13.028339724,13.236057697,14.820029922,-1.48015013,-2.650036217,-1.306347259,-3.30315743,-3.117720521,-2.973556586,-3.813896001,-3.490678302,-4.13626803,-5.544310481,-0.193829184,-0.123668357,0.052960024,0.035327887,0.2657148171,0.3362950901,0.6709631853,0.669928159,0.4576296544,0.3344187274,-2.484537717,1.9080260764,3.9013884353,-0.247295209,1.0097163051,6.2657085207,4.4318884082,4.6894971131,5.0867296201,3.7842119159,-2.678366901,1.7843577196,3.9543484593,-0.211967322,1.2754311223,6.6020036107,5.1028515935,5.3594252722,5.5443592745,4.1186306433 +050,3,6,47,075,Tennessee,Haywood County,18787,18805,18811,18550,18282,18241,18243,18040,17820,17606,17281,17244,17002,6,-261,-268,-41,2,-203,-220,-214,-325,-37,-242,66,221,215,237,238,206,189,195,197,196,186,22,190,200,190,183,188,212,231,238,208,231,44,31,15,47,55,18,-23,-36,-41,-12,-45,0,4,-2,11,6,6,-3,-1,-1,-2,-1,-38,-298,-286,-99,-56,-228,-195,-177,-285,-23,-195,-38,-294,-288,-88,-50,-222,-198,-178,-286,-25,-196,0,2,5,0,-3,1,1,0,2,0,-1,174,174,183,205,198,240,228,195,226,222,237,196,11.830518455,11.674630756,12.978123374,13.046815042,11.355180112,10.54099275,11.008863547,11.293605068,11.354091238,10.862582491,10.171033966,10.860121633,10.404402705,10.031794759,10.362979908,11.823759063,13.041269124,13.644050793,12.049239681,13.490626643,1.6594844892,0.8145091225,2.5737206692,3.0150202829,0.992200204,-1.282766313,-2.032405578,-2.350445725,-0.695148443,-2.628044151,0.2141270309,-0.108601216,0.6023601566,0.3289113036,0.3307334013,-0.167317345,-0.05645571,-0.057327945,-0.115858074,-0.058400981,-15.9524638,-15.52997394,-5.42124141,-3.069838833,-12.56786925,-10.87562744,-9.992660758,-16.33846418,-1.332367849,-11.38819132,-15.73833677,-15.63857515,-4.818881253,-2.74092753,-12.23713585,-11.04294479,-10.04911647,-16.39579213,-1.448225923,-11.4465923 +050,3,6,47,077,Tennessee,Henderson County,27769,27786,27794,28048,28094,28057,28107,28092,27860,27868,27924,28050,28076,8,254,46,-37,50,-15,-232,8,56,126,26,93,336,322,307,331,317,312,342,300,312,299,61,279,316,322,312,341,378,332,354,326,364,32,57,6,-15,19,-24,-66,10,-54,-14,-65,0,1,-5,-2,-2,-1,-1,-2,-2,-2,-2,-23,197,48,-15,40,15,-165,1,113,143,94,-23,198,43,-17,38,14,-166,-1,111,141,92,-1,-1,-3,-5,-7,-5,0,-1,-1,-1,-1,218,218,242,286,312,321,324,307,350,369,378,367,12.033952939,11.470913042,10.934800805,11.786909764,11.281339526,11.152416357,12.273901809,10.754229997,11.148033015,10.654598582,9.9924787794,11.257169321,11.46907446,11.110319778,12.13544725,13.511581355,11.915015791,12.689991397,11.648265266,12.970815665,2.0414741592,0.2137437213,-0.534273655,0.6765899865,-0.854107724,-2.359164999,0.3588860178,-1.935761399,-0.500232251,-2.316217083,0.0358153361,-0.178119768,-0.071236487,-0.071219999,-0.035587822,-0.035744924,-0.071777204,-0.071694867,-0.07146175,-0.071268218,7.055621217,1.7099497702,-0.534273655,1.4243999715,0.5338173277,-5.897912496,0.0358886018,4.0507599656,5.109515132,3.3496062431,7.0914365531,1.5318300025,-0.605510142,1.3531799729,0.4982295059,-5.933657421,-0.035888602,3.9790650989,5.0380533819,3.2783380252 +050,3,6,47,079,Tennessee,Henry County,32330,32349,32396,32442,32379,32247,32247,32133,32213,32387,32289,32309,32056,47,46,-63,-132,0,-114,80,174,-98,20,-253,101,324,332,370,304,343,314,326,325,319,305,85,426,456,492,439,450,491,470,494,463,525,16,-102,-124,-122,-135,-107,-177,-144,-169,-144,-220,2,16,7,14,7,3,-5,-1,-2,-3,-2,30,134,59,-20,135,-6,262,320,75,168,-31,32,150,66,-6,142,-3,257,319,73,165,-33,-1,-2,-5,-4,-7,-4,0,-1,-2,-1,0,491,491,521,491,505,491,479,482,483,504,500,497,9.9941392393,10.243593897,11.450499799,9.4272335411,10.655483069,9.759736425,10.092879257,10.050095862,9.8764667637,9.4772003418,13.140442333,14.069514509,15.226070003,13.613669489,13.979496738,15.2612439,14.551083591,15.276145711,14.334809127,16.313213703,-3.146303094,-3.825920612,-3.775570204,-4.186435948,-3.324013669,-5.501507475,-4.458204334,-5.226049848,-4.458342364,-6.836013361,0.4935377402,0.2159793894,0.4332621546,0.2170744565,0.0931966449,-0.155409816,-0.030959752,-0.061846744,-0.092882133,-0.062145576,4.1333785743,1.8203977106,-0.618945935,4.1864359475,-0.18639329,8.1434743418,9.907120743,2.3192528913,5.2013994241,-0.963256428,4.6269163145,2.0363771,-0.185683781,4.4035104041,-0.093196645,7.9880645262,9.8761609907,2.2574061476,5.1085172916,-1.025402004 +050,3,6,47,081,Tennessee,Hickman County,24690,24692,24649,24369,24200,24219,24481,24395,24656,24871,25017,25155,25387,-43,-280,-169,19,262,-86,261,215,146,138,232,57,268,253,258,305,301,239,289,265,264,269,71,274,277,249,269,292,273,296,298,300,291,-14,-6,-24,9,36,9,-34,-7,-33,-36,-22,3,3,-1,4,8,-2,1,-1,1,-2,0,-31,-279,-145,9,215,-91,294,221,178,176,253,-28,-276,-146,13,223,-93,295,220,179,174,253,-1,2,1,-3,3,-2,0,2,0,0,1,1513,1513,1513,1513,1513,1553,1513,1534,1562,1541,1534,1477,10.93475866,10.418167967,10.656973502,12.525667351,12.316883542,9.744959328,11.670402003,10.623797306,10.523798134,10.644612402,11.17956669,11.406452676,10.285218613,11.047227926,11.948604632,11.131271534,11.9530761,11.946760744,11.958861516,11.515175498,-0.24480803,-0.988284708,0.3717548896,1.4784394251,0.3682789099,-1.386312206,-0.282674097,-1.322963438,-1.435063382,-0.870563096,0.1224040149,-0.04117853,0.1652243954,0.3285420945,-0.081839758,0.0407738884,-0.040382014,0.0400898012,-0.079725743,0,-11.38357338,-5.97088678,0.3717548896,8.8295687885,-3.723708978,11.98752319,8.9244250611,7.1359846055,7.0158654229,10.011475604,-11.26116937,-6.012065309,0.536979285,9.158110883,-3.805548736,12.028297079,8.8840430472,7.1760744067,6.9361396795,10.011475604 +050,3,6,47,083,Tennessee,Houston County,8426,8428,8450,8346,8425,8276,8222,8127,8110,8160,8235,8206,8292,22,-104,79,-149,-54,-95,-17,50,75,-29,86,23,98,69,76,68,102,94,81,83,77,80,9,109,111,106,115,96,115,135,122,100,110,14,-11,-42,-30,-47,6,-21,-54,-39,-23,-30,0,2,2,1,0,-1,-1,0,0,0,0,9,-96,116,-122,-5,-101,4,104,114,-6,117,9,-94,118,-121,-5,-102,3,104,114,-6,117,-1,1,3,2,-2,1,1,0,0,0,-1,177,177,175,195,177,177,177,177,178,177,178,181,11.669445106,8.2284896548,9.1012514221,8.2434234453,12.47782739,11.578493564,9.9569760295,10.125038121,9.3668268354,9.6981452297,12.979280781,13.237135532,12.693850668,13.941083768,11.743837544,14.165178296,16.594960049,14.882586154,12.164710176,13.334949691,-1.309835675,-5.008645877,-3.592599246,-5.697660322,0.7339898465,-2.586684732,-6.63798402,-4.757548033,-2.79788334,-3.636804461,0.2381519409,0.2385069465,0.1197533082,0,-0.122331641,-0.123175463,0,0,0,0,-11.43129317,13.833402898,-14.6099036,-0.606134077,-12.35549575,0.4927018538,12.784265519,13.906678866,-0.729882611,14.183537398,-11.19314122,14.071909844,-14.49015029,-0.606134077,-12.47782739,0.3695263903,12.784265519,13.906678866,-0.729882611,14.183537398 +050,3,6,47,085,Tennessee,Humphreys County,18538,18534,18557,18403,18285,18243,18145,18153,18378,18519,18559,18596,18590,23,-154,-118,-42,-98,8,225,141,40,37,-6,53,216,203,215,186,200,188,215,222,218,207,65,232,221,264,234,232,238,252,292,247,257,-12,-16,-18,-49,-48,-32,-50,-37,-70,-29,-50,0,5,3,3,2,1,5,7,9,2,3,36,-145,-102,7,-51,41,269,172,101,65,41,36,-140,-99,10,-49,42,274,179,110,67,44,-1,2,-1,-3,-1,-2,1,-1,0,-1,0,205,205,207,205,205,205,217,220,255,259,273,254,11.688311688,11.066288705,11.771791502,10.223150489,11.019890903,10.292628179,11.654064016,11.97475592,11.734625219,11.13322218,12.554112554,12.047535979,14.454664915,12.861382873,12.783073448,13.03002929,13.659647126,15.750579859,13.295653344,13.822406282,-0.865800866,-0.981247274,-2.682873412,-2.638232384,-1.763182544,-2.737401111,-2.00558311,-3.775823939,-1.561028125,-2.689184102,0.2705627706,0.1635412124,0.1642575558,0.1099263493,0.0550994545,0.2737401111,0.3794346424,0.4854630778,0.1076571121,0.1613510461,-7.846320346,-5.560401221,0.3832676303,-2.803121908,2.2590776351,14.727217979,9.3232512128,5.4479745402,3.4988561432,2.2051309633,-7.575757576,-5.396860009,0.5475251862,-2.693195559,2.3141770896,15.00095809,9.7026858552,5.933437618,3.6065132553,2.3664820094 +050,3,6,47,087,Tennessee,Jackson County,11638,11636,11628,11566,11602,11569,11531,11541,11621,11709,11802,11838,11864,-8,-62,36,-33,-38,10,80,88,93,36,26,24,94,111,104,83,102,111,93,107,91,89,20,132,147,154,145,179,166,138,171,165,179,4,-38,-36,-50,-62,-77,-55,-45,-64,-74,-90,0,-1,-1,0,0,1,2,3,2,2,1,-13,-21,71,17,23,86,134,129,153,109,116,-13,-22,70,17,23,87,136,132,155,111,117,1,-2,2,0,1,0,-1,1,2,-1,-1,177,177,202,236,192,178,182,188,197,197,197,185,8.1055445374,9.5821823204,8.9767381641,7.1861471861,8.8418862691,9.5846645367,7.9725675096,9.1021224108,7.6988155668,7.5099147751,11.382254031,12.689917127,13.292477666,12.554112554,15.516643551,14.333822641,11.830261466,14.546382544,13.959390863,15.104210615,-3.276709494,-3.107734807,-4.315739502,-5.367965368,-6.674757282,-4.749158104,-3.857693956,-5.444260134,-6.260575296,-7.59429584,-0.086229197,-0.086325967,0,0,0.0866851595,0.1726966583,0.2571795971,0.1701331292,0.1692047377,0.0843810649,-1.810813141,6.1291436464,1.4673514307,1.9913419913,7.4549237171,11.570676107,11.058722675,13.015184382,9.2216582064,9.7882035271,-1.897042339,6.0428176796,1.4673514307,1.9913419913,7.5416088766,11.743372766,11.315902272,13.185317511,9.3908629442,9.872584592 +050,3,6,47,089,Tennessee,Jefferson County,51407,51673,51719,51918,52316,52157,52439,53049,53193,53760,53989,54563,55307,46,199,398,-159,282,610,144,567,229,574,744,132,520,538,519,516,542,517,493,455,504,485,103,567,567,579,558,573,636,661,685,635,724,29,-47,-29,-60,-42,-31,-119,-168,-230,-131,-239,3,13,25,24,24,31,4,2,9,-12,-8,20,233,396,-117,302,605,260,731,450,717,995,23,246,421,-93,326,636,264,733,459,705,987,-6,0,6,-6,-2,5,-1,2,0,0,-4,1750,1750,1745,1814,1739,1675,1743,1681,1727,1526,1483,1453,10.035026101,10.32292726,9.9355814421,9.8665340931,10.276050356,9.7324975057,9.2190027395,8.4455540191,9.2858722087,8.8286156367,10.942038075,10.879367577,11.084203574,10.669624077,10.863794934,11.972666177,12.360569596,12.714735172,11.699462009,13.179211796,-0.907011974,-0.556440317,-1.148622132,-0.803089984,-0.587744578,-2.240168672,-3.141566856,-4.269181152,-2.4135898,-4.350596159,0.2508756525,0.4796899284,0.4594488528,0.4589085625,0.5877445776,0.0752997873,0.0373996054,0.1670549147,-0.221092195,-0.14562665,4.4964636182,7.5982884663,-2.239813157,5.7745994111,11.470499014,4.8944861731,13.669555786,8.3527457331,13.210258678,18.112314554,4.7473392707,8.0779783948,-1.780364305,6.2335079735,12.058243592,4.9697859604,13.706955392,8.5198006478,12.989166482,17.966687904 +050,3,6,47,091,Tennessee,Johnson County,18244,18240,18287,18227,18164,18020,17942,17851,17782,17611,17759,17773,17849,47,-60,-63,-144,-78,-91,-69,-171,148,14,76,44,168,133,138,154,170,169,116,173,153,149,27,202,198,209,240,218,250,251,265,261,257,17,-34,-65,-71,-86,-48,-81,-135,-92,-108,-108,0,-1,0,-1,-4,-4,-5,-2,-3,-2,-1,31,-25,4,-72,16,-37,18,-33,244,124,184,31,-26,4,-73,12,-41,13,-35,241,122,183,-1,0,-2,0,-4,-2,-1,-1,-1,0,1,1827,1827,1826,1828,1831,1814,1823,1794,1769,1791,1694,1634,9.201949937,7.3094996015,7.6276807429,8.5645959624,9.4990640628,9.485589201,6.5549684966,9.7823013854,8.6119554205,8.3656167537,11.064249329,10.881811437,11.552067212,13.347422279,12.181152739,14.031936688,14.183595626,14.984450099,14.690982776,14.429285273,-1.862299392,-3.572311835,-3.924386469,-4.782826317,-2.682088677,-4.546347487,-7.62862713,-5.202148714,-6.079027356,-6.063668519,-0.054773512,0,-0.055273049,-0.222457038,-0.22350739,-0.280638734,-0.113016698,-0.169635284,-0.112574581,-0.056145079,-1.369337788,0.2198345745,-3.979659518,0.8898281519,-2.067443355,1.0102994415,-1.864775521,13.79700311,6.9796240009,10.330694515,-1.4241113,0.2198345745,-4.034932567,0.667371114,-2.290950745,0.7296607078,-1.977792219,13.627367826,6.8670494202,10.274549436 +050,3,6,47,093,Tennessee,Knox County,432226,432259,432952,436822,440883,444453,448112,451551,456410,461977,466787,470137,475609,693,3870,4061,3570,3659,3439,4859,5567,4810,3350,5472,1277,5085,5272,5201,5140,5339,5315,5234,5217,5141,5136,975,3921,4056,4180,4129,4518,4300,4529,4735,4640,4888,302,1164,1216,1021,1011,821,1015,705,482,501,248,72,612,519,663,472,822,677,768,949,271,238,334,2090,2321,1902,2188,1823,3165,4081,3369,2566,4983,406,2702,2840,2565,2660,2645,3842,4849,4318,2837,5221,-15,4,5,-16,-12,-27,2,13,10,12,3,12348,12349,12352,12469,12426,12355,12516,12348,12417,12787,12457,12376,11.692692585,12.013147926,11.749211599,11.517368483,11.868888684,11.707551316,11.398244966,11.234285567,10.974209221,10.86126719,9.0161352259,9.2422852781,9.4427426423,9.2519872502,10.04376083,9.471772466,9.8629444885,10.196346973,9.9047521464,10.336813478,2.6765573586,2.7708626475,2.3064689564,2.2653812327,1.8251278534,2.2357788495,1.5353004779,1.0379385937,1.0694570744,0.5244537117,1.4072621164,1.182629699,1.4977364526,1.0576260552,1.8273509081,1.4912534789,1.6724975419,2.0435761937,0.5784887568,0.5033063846,4.8058461163,5.2887929316,4.2966738052,4.9027241713,4.0526285954,6.9716650825,8.8873209224,7.2548031577,5.4774987085,10.537713086,6.2131082327,6.4714226306,5.7944102578,5.9603502266,5.8799795034,8.4629185615,10.559818464,9.2983793515,6.0559874654,11.04101947 +050,3,6,47,095,Tennessee,Lake County,7832,7832,7827,7794,7718,7712,7679,7603,7528,7450,7387,7010,6988,-5,-33,-76,-6,-33,-76,-75,-78,-63,-377,-22,17,73,72,59,64,72,67,63,60,64,65,26,109,86,76,104,104,108,103,104,75,97,-9,-36,-14,-17,-40,-32,-41,-40,-44,-11,-32,0,1,0,1,1,1,0,1,1,1,1,5,2,-61,10,4,-43,-35,-40,-19,-366,7,5,3,-61,11,5,-42,-35,-39,-18,-365,8,-1,0,-1,0,2,-2,1,1,-1,-1,2,2506,2506,2506,2500,2491,2533,2535,2482,2481,2478,2188,2225,9.3463926765,9.2831356369,7.6474400518,8.3165486323,9.4228504122,8.8559910118,8.4123380959,8.0878883871,8.8907411266,9.2870410059,13.955572627,11.088189789,9.8509397278,13.514391528,13.610783929,14.275328795,13.753505141,14.019006538,10.418837258,13.859122732,-4.60917995,-1.805054152,-2.203499676,-5.197842895,-4.187933517,-5.419337783,-5.341167045,-5.931118151,-1.528096131,-4.572081726,0.1280327764,0,0.129617628,0.1299460724,0.1308729224,0,0.1335291761,0.1347981398,0.1389178301,0.1428775539,0.2560655528,-7.864878804,1.29617628,0.5197842895,-5.627535663,-4.626263961,-5.341167045,-2.561164656,-50.84392582,1.0001428776,0.3840983292,-7.864878804,1.425793908,0.6497303619,-5.49666274,-4.626263961,-5.207637869,-2.426366516,-50.70500799,1.1430204315 +050,3,6,47,097,Tennessee,Lauderdale County,27815,27822,27722,27703,27698,27578,27359,26907,25319,26088,25980,25608,25451,-100,-19,-5,-120,-219,-452,-1588,769,-108,-372,-157,58,329,295,307,287,290,314,333,297,279,278,92,252,270,286,282,275,333,322,318,278,295,-34,77,25,21,5,15,-19,11,-21,1,-17,2,26,22,32,2,0,-4,-1,-2,-1,0,-70,-122,-48,-175,-226,-474,-1581,748,-84,-371,-142,-68,-96,-26,-143,-224,-474,-1585,747,-86,-372,-142,2,0,-4,2,0,7,16,11,-1,-1,2,2734,2734,2786,2804,2688,2717,2495,1096,1967,2187,2177,2153,11.871898963,10.649627263,11.107894927,10.448331725,10.688091991,12.024662046,12.955434085,11.408158562,10.816468946,10.889363286,9.0933694181,9.747116478,10.348071496,10.26630504,10.135259647,12.752268985,12.527476803,12.214796036,10.77770024,11.555259602,2.7785295444,0.902510785,0.7598234315,0.1820266851,0.5528323444,-0.727606939,0.4279572821,-0.806637474,0.0387687059,-0.665896316,0.9382047812,0.7942094908,1.1578261813,0.072810674,0,-0.153180408,-0.038905207,-0.076822617,-0.038768706,0,-4.402345512,-1.732820707,-6.331861929,-8.227606167,-17.46950208,-60.54455635,29.101095182,-3.226549896,-14.38318989,-5.562192757,-3.464140731,-0.938611216,-5.174035748,-8.154795493,-17.46950208,-60.69773676,29.062189974,-3.303372513,-14.4219586,-5.562192757 +050,3,6,47,099,Tennessee,Lawrence County,41869,41859,41971,42165,42162,42037,42313,42607,43087,43406,43814,44163,44432,112,194,-3,-125,276,294,480,319,408,349,269,142,562,570,550,579,575,577,565,566,574,555,144,480,502,482,543,540,532,568,555,593,555,-2,82,68,68,36,35,45,-3,11,-19,0,0,16,14,17,8,-5,-2,-1,-1,-2,0,110,98,-80,-208,238,265,438,325,397,371,269,110,114,-66,-191,246,260,436,324,396,369,269,4,-2,-5,-2,-6,-1,-1,-2,1,-1,0,407,407,493,484,506,497,564,531,530,542,546,535,13.359323001,13.518801807,13.064288174,13.728512152,13.542157325,13.46652041,13.064641069,12.978674616,13.048865044,12.528923754,11.410097937,11.906032469,11.449067091,12.874925904,12.717852096,12.416271851,13.134010845,12.72643889,13.480796117,12.528923754,1.9492250642,1.6127693384,1.6152210834,0.8535862478,0.8243052285,1.0502485588,-0.069369776,0.2522357258,-0.431931073,0,0.3803365979,0.3320407461,0.4038052708,0.1896858328,-0.11775789,-0.046677714,-0.023123259,-0.022930521,-0.045466429,0,2.3295616621,-1.897375692,-4.940676255,5.643153527,6.2411681583,10.222419306,7.5150590221,9.1034166476,8.4340225286,6.0725774592,2.70989826,-1.565334946,-4.536870984,5.8328393598,6.1234102685,10.175741592,7.4919357636,9.080486127,8.3885560999,6.0725774592 +050,3,6,47,101,Tennessee,Lewis County,12161,12170,12175,12151,11950,12001,11893,11884,11894,12028,12105,12267,12363,5,-24,-201,51,-108,-9,10,134,77,162,96,22,116,128,141,130,143,129,152,147,129,139,17,143,115,155,163,135,171,145,157,163,167,5,-27,13,-14,-33,8,-42,7,-10,-34,-28,0,-2,-2,-1,-2,-1,-1,-1,-1,-1,0,1,6,-217,67,-73,-17,54,127,87,198,124,1,4,-219,66,-75,-18,53,126,86,197,124,-1,-1,5,-1,0,1,-1,1,1,-1,0,217,217,217,217,217,208,210,217,217,207,208,210,9.5371207761,10.621965894,11.774038662,10.881392818,12.028430837,10.850365884,12.707967561,12.182488708,10.585918267,11.287048315,11.756967853,9.5431724825,12.943092146,13.643592534,11.355511629,14.383043149,12.122732213,13.011229437,13.376005252,13.560698335,-2.219847077,1.0787934111,-1.169053484,-2.762199715,0.6729192076,-3.532677265,0.5852353482,-0.828740728,-2.790086985,-2.27365002,-0.164433117,-0.165968217,-0.08350382,-0.167406043,-0.084114901,-0.084111363,-0.08360505,-0.082874073,-0.082061382,0,0.4932993505,-18.00755155,5.5947559601,-6.110320583,-1.429953316,4.542013626,10.617841318,7.2100443376,16.248153619,10.069021518,0.3288662337,-18.17351977,5.5112521398,-6.277726626,-1.514068217,4.4579022626,10.534236268,7.1271702648,16.166092237,10.069021518 +050,3,6,47,103,Tennessee,Lincoln County,33361,33351,33378,33386,33386,33515,33465,33634,33616,33941,34257,34436,34540,27,8,0,129,-50,169,-18,325,316,179,104,95,349,359,347,323,356,370,367,402,355,375,148,366,406,416,368,404,433,408,469,435,443,-53,-17,-47,-69,-45,-48,-63,-41,-67,-80,-68,2,26,12,25,10,13,23,41,24,27,21,77,2,44,176,-8,207,25,326,359,233,150,79,28,56,201,2,220,48,367,383,260,171,1,-3,-9,-3,-7,-3,-3,-1,0,-1,1,283,283,283,283,283,283,283,283,326,367,298,287,10.454736085,10.753010244,10.373537017,9.6446700508,10.611186456,11.003717472,10.86489927,11.789202029,10.33584208,10.873347251,10.963992571,12.160785958,12.436286453,10.988354733,12.041908225,12.87732342,12.078689107,13.754069034,12.665045929,12.845047553,-0.509256486,-1.407775714,-2.062749436,-1.343684682,-1.430721769,-1.873605948,-1.213789837,-1.964867005,-2.329203849,-1.971700302,0.7788628602,0.3594320973,0.747372984,0.298596596,0.3874871459,0.6840148699,1.2137898367,0.703832957,0.786106299,0.6089074461,0.0599125277,1.31791769,5.2615058071,-0.238877277,6.1699876302,0.7434944238,9.6511094335,10.528167981,6.7838062102,4.3493389005,0.8387753879,1.6773497873,6.008878791,0.0597193192,6.5574747761,1.4275092937,10.86489927,11.232000938,7.5699125093,4.9582463466 +050,3,6,47,105,Tennessee,Loudon County,48556,48569,48719,49200,49842,50408,50613,50950,51427,52319,53152,54039,54910,150,481,642,566,205,337,477,892,833,887,871,117,545,544,534,538,532,552,518,478,493,490,153,535,573,668,598,645,655,662,657,684,689,-36,10,-29,-134,-60,-113,-103,-144,-179,-191,-199,4,62,0,-6,21,51,47,82,27,62,50,171,410,655,692,245,401,534,950,982,1020,1024,175,472,655,686,266,452,581,1032,1009,1082,1074,11,-1,16,14,-1,-2,-1,4,3,-4,-4,480,480,535,536,533,500,480,487,510,557,552,481,11.131649629,10.985238586,10.653366584,10.65125073,10.476256117,10.783672114,9.9859271683,9.0641029288,9.198533459,8.9950343739,10.927399177,11.570848731,13.326683292,11.839122559,12.701475931,12.795842816,12.76193781,12.458400887,12.762265489,12.648119762,0.2042504519,-0.585610145,-2.673316708,-1.187871829,-2.225219814,-2.012170702,-2.776010641,-3.394297959,-3.56373203,-3.653085389,1.2663528018,0,-0.119700748,0.41575514,1.004302748,0.9181749807,1.5807838374,0.5119890776,1.1568135385,0.9178606504,8.3742685281,13.2267119,13.805486284,4.8504766336,7.8965765092,10.432030632,18.313959092,18.621232377,19.031448536,18.79778612,9.6406213299,13.2267119,13.685785536,5.2662317736,8.9008792572,11.350205613,19.89474293,19.133221454,20.188262074,19.715646771 +050,3,6,47,107,Tennessee,McMinn County,52266,52283,52173,52334,52441,52437,52687,52519,52697,52918,53329,53810,54208,-110,161,107,-4,250,-168,178,221,411,481,398,105,568,598,546,583,572,567,571,613,572,582,172,663,588,641,717,671,684,676,712,678,727,-67,-95,10,-95,-134,-99,-117,-105,-99,-106,-145,7,69,55,78,57,55,39,46,59,24,23,-45,189,52,19,329,-117,257,284,451,563,522,-38,258,107,97,386,-62,296,330,510,587,545,-5,-2,-10,-6,-2,-7,-1,-4,0,0,-2,942,942,935,988,1019,1056,983,1022,1061,1078,1051,1066,10.870085257,11.414936769,10.412097866,11.091663179,10.87390453,10.777828467,10.812858022,11.539149341,10.677717731,10.775981781,12.688145292,11.224051539,12.223726616,13.641033446,12.755926468,13.001824818,12.801211949,13.402731371,12.656455632,13.46071951,-1.818060034,0.1908852303,-1.81162875,-2.549370267,-1.882021938,-2.22399635,-1.988353927,-1.863582031,-1.978737901,-2.684737729,1.3204857091,1.0498687664,1.4874425523,1.0844336212,1.0455677433,0.7413321168,0.8710883871,1.110619594,0.4480161286,0.4258549501,3.6169825945,0.9926031973,0.3623257499,6.2592747612,-2.224207745,4.8851885645,5.3780239549,8.4896514725,10.509711683,9.665055824,4.9374683036,2.0424719637,1.8497683022,7.3437083825,-1.178640002,5.6265206813,6.249112342,9.6002710665,10.957727812,10.090910774 +050,3,6,47,109,Tennessee,McNairy County,26075,26082,26065,26079,26148,26040,26039,25874,25845,26030,25837,25662,25696,-17,14,69,-108,-1,-165,-29,185,-193,-175,34,72,293,296,283,267,266,264,287,274,258,256,111,345,315,345,331,387,347,396,388,370,384,-39,-52,-19,-62,-64,-121,-83,-109,-114,-112,-128,0,12,-2,-1,-1,3,8,9,13,4,3,23,55,94,-44,67,-44,48,284,-90,-67,159,23,67,92,-45,66,-41,56,293,-77,-63,162,-1,-1,-4,-1,-3,-3,-2,1,-2,0,0,313,313,329,328,314,313,313,340,352,354,330,317,11.23810985,11.335133169,10.845405074,10.253653104,10.24791478,10.209014095,11.065060241,10.565484798,10.019612031,9.9692355621,13.232586683,12.062726176,13.221430214,12.711457593,14.909560226,13.418666254,15.26746988,14.961343436,14.369211053,14.953853343,-1.994476833,-0.727593007,-2.37602514,-2.457804489,-4.661645445,-3.209652159,-4.202409639,-4.395858638,-4.349599021,-4.984617781,0.4602638846,-0.076588738,-0.038322986,-0.038403195,0.1155779862,0.3093640635,0.3469879518,0.5012821254,0.1553428222,0.1168269792,2.1095428045,3.5996706684,-1.68621139,2.5730140748,-1.695143798,1.856184381,10.94939759,-3.470414715,-2.601992272,6.1918298999,2.5698066892,3.5230819308,-1.724534376,2.5346108796,-1.579565812,2.1655484445,11.296385542,-2.969132589,-2.44664945,6.3086568792 +050,3,6,47,111,Tennessee,Macon County,22248,22225,22236,22452,22486,22634,22916,23075,23364,23931,24294,24624,24827,11,216,34,148,282,159,289,567,363,330,203,74,323,294,312,324,343,334,319,345,324,329,87,229,253,298,289,265,273,273,292,245,278,-13,94,41,14,35,78,61,46,53,79,51,9,74,51,54,2,4,12,15,17,-2,4,16,48,-56,83,242,80,215,505,293,252,147,25,122,-5,137,244,84,227,520,310,250,151,-1,0,-2,-3,3,-3,1,1,0,1,1,269,269,269,271,272,267,297,305,318,317,365,339,14.455782313,13.084694468,13.829787234,14.226125137,14.915961819,14.384461336,13.489798076,14.307931571,13.246657672,13.306100989,10.248836377,11.259958165,13.209219858,12.68935236,11.523993825,11.757359116,11.544560736,12.109901503,10.016762746,11.243453115,4.2069459363,1.8247363034,0.6205673759,1.5367727772,3.3919679937,2.6271022201,1.9452373401,2.1980300674,3.2298949262,2.0626478737,3.3118510562,2.2697939383,2.3936170213,0.0878155873,0.1739470766,0.5168069941,0.6343165239,0.7050285122,-0.081769492,0.1617763038,2.1482277121,-2.492322756,3.6790780142,10.625686059,3.478941532,9.2594586447,21.355322973,12.151373769,10.302955967,5.9452791652,5.4600787683,-0.222528817,6.0726950355,10.713501647,3.6528886086,9.7762656388,21.989639497,12.856402281,10.221186475,6.1070554691 +050,3,6,47,113,Tennessee,Madison County,98294,98302,98251,98095,98532,98760,98172,97613,97535,97543,97706,98046,98360,-51,-156,437,228,-588,-559,-78,8,163,340,314,298,1214,1316,1277,1246,1221,1260,1219,1228,1212,1217,271,893,855,950,921,1008,1016,1116,1076,1046,1049,27,321,461,327,325,213,244,103,152,166,168,0,80,47,83,62,63,46,80,95,43,39,-72,-555,-48,-165,-981,-840,-366,-171,-81,129,103,-72,-475,-1,-82,-919,-777,-320,-91,14,172,142,-6,-2,-23,-17,6,5,-2,-4,-3,2,4,4418,4419,4445,4423,4431,4460,4437,4385,4368,4469,4523,4563,12.365925458,13.385750685,12.945279079,12.65411411,12.472865643,12.913276078,12.497565077,12.578809623,12.383015244,12.392696761,9.0961873428,8.6966693282,9.6303955558,9.3534824203,10.297009475,10.412609917,11.441577215,11.021823415,10.686991704,10.681954726,3.2697381154,4.6890813571,3.3148835229,3.3006316901,2.1758561688,2.5006661611,1.0559878613,1.5569862074,1.69602354,1.7107420344,0.8148880038,0.4780625245,0.8413924538,0.6296589686,0.6435630922,0.4714370632,0.8201847466,0.9731163796,0.4393313989,0.3971365437,-5.653285527,-0.488234068,-1.672647649,-9.962829809,-8.580841229,-3.750999242,-1.753144896,-0.829709755,1.3179941967,1.0488477949,-4.838397523,-0.010171543,-0.831255195,-9.333170841,-7.937278137,-3.279562178,-0.932960149,0.1434066244,1.7573255957,1.4459843386 +050,3,6,47,115,Tennessee,Marion County,28237,28226,28227,28107,28237,28337,28416,28407,28375,28425,28593,28878,28924,1,-120,130,100,79,-9,-32,50,168,285,46,70,286,310,279,331,353,296,321,338,306,307,100,314,331,374,402,386,376,424,350,353,371,-30,-28,-21,-95,-71,-33,-80,-103,-12,-47,-64,0,5,2,13,2,0,5,3,2,2,2,33,-97,153,182,149,29,44,152,178,330,107,33,-92,155,195,151,29,49,155,180,332,109,-2,0,-4,0,-1,-5,-1,-2,0,0,1,250,250,250,260,268,301,270,292,302,298,317,276,10.153725991,11.003833594,9.8631880369,11.664581608,12.424546398,10.425839174,11.302816901,11.855905153,10.648848985,10.622469811,11.147797067,11.749254579,13.221621239,14.166651983,13.586047903,13.243633546,14.929577465,12.276824862,12.284456508,12.836926058,-0.994071076,-0.745420985,-3.358433203,-2.502070375,-1.161501505,-2.817794371,-3.626760563,-0.42091971,-1.635607524,-2.214456247,0.1775126922,0.0709924748,0.4595750698,0.0704808556,0,0.1761121482,0.1056338028,0.0701532849,0.0696003202,0.0692017577,-3.443746228,5.430924322,6.4340509775,5.250823745,1.0207134435,1.5497869043,5.3521126761,6.2436423586,11.484052827,3.7022940383,-3.266233536,5.5019167968,6.8936260473,5.3213046006,1.0207134435,1.7258990525,5.4577464789,6.3137956435,11.553653147,3.771495796 +050,3,6,47,117,Tennessee,Marshall County,30617,30611,30688,30855,30980,31147,31293,31597,32076,33077,33865,34507,35016,77,167,125,167,146,304,479,1001,788,642,509,95,371,357,354,341,408,380,373,433,406,425,50,327,279,302,319,334,371,345,379,331,388,45,44,78,52,22,74,9,28,54,75,37,4,12,13,15,3,44,68,75,71,34,32,32,111,40,105,126,187,402,895,659,533,442,36,123,53,120,129,231,470,970,730,567,474,-4,0,-6,-5,-5,-1,0,3,4,0,-2,359,359,359,409,425,405,386,422,431,435,397,384,12.056610825,11.546858575,11.396011396,10.922485586,12.975035777,11.935985426,11.449971605,12.936571958,11.876206634,12.226169757,10.62671628,9.0240155252,9.7220210215,10.217809097,10.621720464,11.653291034,10.590456311,11.323235039,9.6823260984,11.161773801,1.4298945453,2.5228430501,1.6739903746,0.7046764894,2.3533153125,0.2826943917,0.8595152948,1.6133369185,2.1938805359,1.0643959553,0.3899712396,0.4204738417,0.4828818388,0.0960922486,1.3992685642,2.1359131814,2.302273111,2.1212392818,0.9945591763,0.920558664,3.6072339665,1.2937656667,3.3801728717,4.0358744395,5.9468913977,12.627016161,27.473792458,19.688685728,15.591177675,12.715216547,3.9972052061,1.7142395084,3.8630547105,4.131966688,7.3461599618,14.762929342,29.776065569,21.80992501,16.585736851,13.635775211 +050,3,6,47,119,Tennessee,Maury County,80956,80986,81230,81601,82147,83722,85498,87547,89719,92393,94577,96795,99590,244,371,546,1575,1776,2049,2172,2674,2184,2218,2795,312,1143,1043,1061,1088,1134,1185,1182,1236,1223,1207,152,745,733,795,842,938,927,945,980,992,1084,160,398,310,266,246,196,258,237,256,231,123,18,114,77,84,44,53,20,54,53,19,16,68,-138,171,1198,1448,1777,1884,2367,1866,1970,2668,86,-24,248,1282,1492,1830,1904,2421,1919,1989,2684,-2,-3,-12,27,38,23,10,16,9,-2,-12,1009,1009,1044,1075,1058,1044,1058,1087,1130,1067,1013,1010,14.03909575,12.73908689,12.793228391,12.859000118,13.106417406,13.369738134,12.981022667,13.221372413,12.781389127,12.292181175,9.1505917178,8.9527811027,9.5858780122,9.9515423709,10.841110694,10.458858439,10.378228782,10.482965182,10.367242857,11.03953968,4.8885040318,3.7863057869,3.2073503789,2.9074577473,2.2653067121,2.9108796949,2.6027938851,2.7384072311,2.4141462701,1.252641495,1.4002247729,0.9404695019,1.0128474881,0.520033093,0.6125574273,0.2256495888,0.5930416447,0.5669358721,0.1985661434,0.1629452351,-1.695008936,2.0885751276,14.445134413,17.113816334,20.538010344,21.256191261,25.994992093,19.960421458,20.588173819,27.171117957,-0.294784163,3.0290446296,15.457981901,17.633849427,21.150567771,21.481840849,26.588033737,20.52735733,20.786739962,27.334063192 +050,3,6,47,121,Tennessee,Meigs County,11753,11766,11791,11689,11673,11668,11713,11813,11974,12054,12267,12358,12532,25,-102,-16,-5,45,100,161,80,213,91,174,34,93,105,143,108,125,140,109,129,135,130,25,151,148,160,140,148,169,180,158,181,184,9,-58,-43,-17,-32,-23,-29,-71,-29,-46,-54,0,-3,-1,0,-1,0,0,0,0,0,0,17,-42,32,11,79,122,190,151,240,138,229,17,-45,31,11,78,122,190,151,240,138,229,-1,1,-4,1,-1,1,0,0,2,-1,-1,128,128,148,129,138,133,143,129,135,135,150,148,7.9216354344,8.988956425,12.253116833,9.2382703905,10.626540848,11.771135494,9.0727484601,10.608116443,10.964467005,10.445962234,12.862010221,12.670148104,13.709781072,11.975535691,12.581824365,14.209442132,14.982520393,12.992886806,14.700507614,14.785054239,-4.940374787,-3.681191679,-1.456664239,-2.737265301,-1.955283516,-2.438306638,-5.909771933,-2.384770363,-3.736040609,-4.339092005,-0.255536627,-0.085609109,0,-0.085539541,0,0,0,0,0,0,-3.577512777,2.7394914819,0.9425474487,6.7576237116,10.371503868,15.975112456,12.568669885,19.736030591,11.208121827,18.400964243,-3.833049404,2.6538823731,0.9425474487,6.6720841709,10.371503868,15.975112456,12.568669885,19.736030591,11.208121827,18.400964243 +050,3,6,47,123,Tennessee,Monroe County,44519,44496,44610,44911,45106,45242,45407,45645,45905,46032,46303,46650,47177,114,301,195,136,165,238,260,127,271,347,527,131,502,450,499,549,494,516,446,503,513,507,94,527,469,481,529,549,542,590,603,599,631,37,-25,-19,18,20,-55,-26,-144,-100,-86,-124,4,51,22,63,24,12,1,-11,-9,-21,-14,75,275,191,62,126,285,287,284,379,455,669,79,326,213,125,150,297,288,273,370,434,655,-2,0,1,-7,-5,-4,-2,-2,1,-1,-4,500,500,475,501,505,532,484,520,561,563,514,514,11.215245585,9.9981114678,11.046177004,12.112654304,10.850942319,11.272528673,9.7022961376,10.895110197,11.037836326,10.807123749,11.773773751,10.420253952,10.647717714,11.671391852,12.059043184,11.840524304,12.834876056,13.061136081,12.888233839,13.450286165,-0.558528167,-0.422142484,0.3984592907,0.4412624519,-1.208100865,-0.567995631,-3.132579919,-2.166025884,-1.850397513,-2.643162416,1.1393974598,0.4887965606,1.3946075176,0.5295149422,0.2635856434,0.0218459858,-0.239294299,-0.19494233,-0.451841253,-0.298421563,6.1438098323,4.2436428675,1.3724708903,2.7799534468,6.26015903,6.2697979246,6.1781437289,8.2092381004,9.7898938173,14.26028755,7.2832072921,4.7324394281,2.7670784079,3.3094683891,6.5237446734,6.2916439104,5.9388494295,8.0142957708,9.3380525642,13.961865987 +050,3,6,47,125,Tennessee,Montgomery County,172331,172361,173181,176603,184946,184480,189294,192749,194823,200228,205849,209807,214251,820,3422,8343,-466,4814,3455,2074,5405,5621,3958,4444,774,2997,3496,3406,3291,3448,3443,3393,3523,3479,3482,310,1030,1088,1099,1131,1181,1285,1239,1476,1433,1483,464,1967,2408,2307,2160,2267,2158,2154,2047,2046,1999,150,345,1557,826,592,770,332,118,-62,-69,-8,184,1103,4192,-3667,2002,422,-409,3102,3606,1971,2445,334,1448,5749,-2841,2594,1192,-77,3220,3544,1902,2437,22,7,186,68,60,-4,-7,31,30,10,8,3416,3411,3316,3239,3444,3372,3493,3580,4052,3743,3800,3706,17.136289825,19.339010756,18.439416825,17.609571559,18.050324178,17.767021353,17.177528977,17.351389022,16.739804069,16.422281858,5.8893488553,6.01854797,5.9497707254,6.0517853034,6.1825501318,6.6310259771,6.2726078405,7.2695572515,6.8951248148,6.9943262478,11.246940969,13.320462787,12.4896461,11.557786256,11.867774046,11.135995376,10.904921137,10.081831771,9.844679254,9.4279556098,1.9726459758,8.6129404313,4.4718022013,3.1676895664,4.0309598658,1.7132300579,0.5973912229,-0.305360806,-0.332005312,-0.037730688,6.3067493081,23.189111296,-19.8524197,10.712355595,2.209175407,-2.110575583,15.70430147,17.760178488,9.4838039148,11.531441454,8.2793952839,31.802051727,-15.3806175,13.880045161,6.2401352727,-0.397345525,16.301692693,17.454817682,9.1517986027,11.493710766 +050,3,6,47,127,Tennessee,Moore County,6362,6345,6333,6368,6290,6276,6286,6261,6287,6387,6431,6439,6438,-12,35,-78,-14,10,-25,26,100,44,8,-1,17,44,48,52,55,48,42,55,55,61,57,28,65,68,70,58,71,58,72,73,61,63,-11,-21,-20,-18,-3,-23,-16,-17,-18,0,-6,0,1,0,0,0,8,12,12,13,5,4,-1,55,-58,4,15,-10,31,105,50,3,0,-1,56,-58,4,15,-2,43,117,63,8,4,0,0,0,0,-2,0,-1,0,-1,0,1,104,104,101,86,101,94,101,90,104,104,104,104,6.9285883001,7.5841365145,8.27630113,8.7565674256,7.65123137,6.6942939114,8.6791857346,8.5816820097,9.4794094794,8.8529937097,10.235414534,10.744193395,11.141174598,9.2341983761,11.317446402,9.2445011157,11.361843143,11.390232486,9.4794094794,9.7848877844,-3.306826234,-3.160056881,-2.864873468,-0.47763095,-3.666215031,-2.550207204,-2.682657409,-2.808550476,0,-0.931894075,0.1574679159,0,0,0,1.2752052283,1.9126554033,1.8936405239,2.0283975659,0.777000777,0.6212627165,8.6607353752,-9.164164955,0.6366385485,2.3881547524,-1.594006535,4.9410264584,16.569354584,7.8015290997,0.4662004662,0,8.8182032911,-9.164164955,0.6366385485,2.3881547524,-0.318801307,6.8536818617,18.462995108,9.8299266656,1.2432012432,0.6212627165 +050,3,6,47,129,Tennessee,Morgan County,21987,21995,22028,22010,21908,21691,21714,21514,21761,21574,21541,21385,21431,33,-18,-102,-217,23,-200,247,-187,-33,-156,46,55,195,166,215,180,230,217,193,194,207,188,33,225,204,227,233,241,249,254,252,259,263,22,-30,-38,-12,-53,-11,-32,-61,-58,-52,-75,0,1,0,0,2,2,2,2,0,1,1,12,12,-63,-209,77,-193,277,-128,25,-106,121,12,13,-63,-209,79,-191,279,-126,25,-105,122,-1,-1,-1,4,-3,2,0,0,0,1,-1,2527,2527,2594,2490,2378,2420,2240,2385,2331,2245,2265,2265,8.8559880104,7.5595427843,9.8626115278,8.2939753485,10.641251041,10.028885038,8.9073497173,8.9991882176,9.6445044961,8.7817638266,10.218447704,9.2900405301,10.413082869,10.736090312,11.150180439,11.50779896,11.722626053,11.689667169,12.067278572,12.285127055,-1.362459694,-1.730497746,-0.550471341,-2.442114964,-0.508929398,-1.478913923,-2.815276336,-2.690478952,-2.422774076,-3.503363229,0.0454153231,0,0,0.0921552816,0.0925326177,0.0924321202,0.0923041421,0,0.0465918092,0.0467115097,0.5449838776,-2.868983105,-9.587375857,3.5479783435,-8.929397613,12.801848642,-5.907465097,1.1596892033,-4.938731771,5.6520926756,0.5903992007,-2.868983105,-9.587375857,3.6401336252,-8.836864995,12.894280763,-5.815160955,1.1596892033,-4.892139962,5.6988041854 +050,3,6,47,131,Tennessee,Obion County,31807,31807,31822,31679,31320,31032,30845,30580,30572,30409,30353,30249,30131,15,-143,-359,-288,-187,-265,-8,-163,-56,-104,-118,79,355,378,347,331,333,365,337,344,351,347,63,381,429,393,394,371,374,391,373,411,442,16,-26,-51,-46,-63,-38,-9,-54,-29,-60,-95,-2,-4,-3,2,5,8,8,19,10,14,12,6,-112,-314,-244,-128,-234,-5,-128,-36,-60,-34,4,-116,-317,-242,-123,-226,3,-109,-26,-46,-22,-5,-1,9,0,-1,-1,-2,0,-1,2,-1,461,461,461,461,461,461,439,461,461,461,461,461,11.180926285,12.000190479,11.130356685,10.698644084,10.842490842,11.937467295,11.052622948,11.322866265,11.583776113,11.493872143,11.999811027,13.619263798,12.605850654,12.734941901,12.07977208,12.231815803,12.823666388,12.277410223,13.563908782,14.640609473,-0.818884742,-1.619073319,-1.47549397,-2.036297817,-1.237281237,-0.294348509,-1.77104344,-0.954543958,-1.980132669,-3.14673733,-0.125982268,-0.095239607,0.0641519117,0.1616109378,0.2604802605,0.2616431188,0.623144914,0.3291530891,0.4620309561,0.3974826101,-3.527503504,-9.968412197,-7.826533231,-4.137240008,-7.619047619,-0.163526949,-4.198028894,-1.184951121,-1.980132669,-1.126200729,-3.653485772,-10.0636518,-7.762381319,-3.975629071,-7.358567359,0.0981161695,-3.57488398,-0.855798032,-1.518101713,-0.728718119 +050,3,6,47,133,Tennessee,Overton County,22083,22076,22085,22160,22158,21965,21945,22062,21951,21995,22071,22271,22566,9,75,-2,-193,-20,117,-111,44,76,200,295,65,253,260,212,241,221,218,232,235,241,241,81,264,275,311,285,278,305,292,351,306,337,-16,-11,-15,-99,-44,-57,-87,-60,-116,-65,-96,1,-1,0,1,1,3,2,0,1,-1,-1,25,87,17,-91,27,171,-24,104,191,268,393,26,86,17,-90,28,174,-22,104,192,267,392,-1,0,-4,-4,-4,0,-2,0,0,-2,-1,286,286,289,286,286,290,286,286,274,282,275,286,11.436320488,11.73338147,9.6095007139,10.976998406,10.043856659,9.9061640879,10.558412597,10.665819453,10.870055478,10.750050182,11.933551814,12.410307324,14.096956236,12.9810977,12.634353626,13.859541499,13.289036545,15.93064948,13.801813179,15.032227848,-0.497231326,-0.676925854,-4.487455522,-2.004099294,-2.590496966,-3.953377411,-2.730623948,-5.264830028,-2.931757702,-4.282177666,-0.045202848,0,0.0453278336,0.0455477112,0.1363419456,0.0908822393,0,0.0453864658,-0.045103965,-0.044606017,3.9326477568,0.7671826346,-4.124832854,1.2297882031,7.7714908992,-1.090586872,4.7330815091,8.6688149594,12.087862523,17.530164819,3.887444909,0.7671826346,-4.07950502,1.2753359144,7.9078328448,-0.999704633,4.7330815091,8.7142014251,12.042758558,17.485558802 +050,3,6,47,135,Tennessee,Perry County,7915,7930,7940,7867,7856,7883,7822,7855,7888,7963,8065,8084,8099,10,-73,-11,27,-61,33,33,75,102,19,15,31,91,92,103,102,100,95,98,111,109,106,39,97,94,111,108,132,126,121,132,107,106,-8,-6,-2,-8,-6,-32,-31,-23,-21,2,0,0,0,0,2,0,5,7,9,10,6,4,18,-66,-8,34,-54,59,59,90,114,11,9,18,-66,-8,36,-54,64,66,99,124,17,13,0,-1,-1,-1,-1,1,-2,-1,-1,0,2,123,123,123,123,123,123,123,130,129,123,123,129,11.513886253,11.702601285,13.088506258,12.989493792,12.757542897,12.068855999,12.365150464,13.850761168,13.499287882,13.100166842,12.273043588,11.95700566,14.105089269,13.753581662,16.839956624,16.007114273,15.267175573,16.471175443,13.251594526,13.100166842,-0.759157335,-0.254404376,-1.01658301,-0.76408787,-4.082413727,-3.938258274,-2.902025109,-2.620414275,0.2476933556,0,0,0,0.2541457526,0,0.6378771449,0.8892841263,1.1355750426,1.2478163214,0.7430800669,0.4943459186,-8.350730689,-1.017617503,4.320477794,-6.876790831,7.5269503094,7.4953947786,11.355750426,14.225106064,1.3623134559,1.1122783168,-8.350730689,-1.017617503,4.5746235466,-6.876790831,8.1648274542,8.3846789049,12.491325468,15.472922386,2.1053935228,1.6066242353 +050,3,6,47,137,Tennessee,Pickett County,5077,5086,5082,5125,5049,5015,5081,5143,5093,5069,5050,5068,5061,-4,43,-76,-34,66,62,-50,-24,-19,18,-7,15,42,39,26,45,47,45,51,29,43,41,20,66,72,85,53,74,62,76,94,68,63,-5,-24,-33,-59,-8,-27,-17,-25,-65,-25,-22,1,-2,-1,-2,-2,0,0,0,0,0,0,0,68,-42,28,72,89,-33,2,46,44,15,1,66,-43,26,70,89,-33,2,46,44,15,0,1,0,-1,4,0,0,-1,0,-1,0,74,74,92,75,74,75,75,69,66,68,65,65,8.2296463212,7.6666011402,5.1669316375,8.9144215531,9.1940532081,8.7924970692,10.037394214,5.731791679,8.4997034987,8.0955671833,12.932301362,14.153725182,16.891891892,10.499207607,14.475743349,12.114107073,14.957685495,18.57891096,13.441391579,12.439530062,-4.702655041,-6.487124042,-11.72496025,-1.584786054,-5.281690141,-3.321610004,-4.920291281,-12.84711928,-4.941688081,-4.343962879,-0.39188792,-0.196579516,-0.39745628,-0.396196513,0,0,0,0,0,0,13.324189282,-8.256339689,5.5643879173,14.263074485,17.410015649,-6.447831184,0.3936233025,9.0918074909,8.6973710219,2.961792872,12.932301362,-8.452919206,5.1669316375,13.866877971,17.410015649,-6.447831184,0.3936233025,9.0918074909,8.6973710219,2.961792872 +050,3,6,47,139,Tennessee,Polk County,16825,16821,16813,16772,16626,16636,16690,16778,16787,16769,16880,16764,16835,-8,-41,-146,10,54,88,9,-18,111,-116,71,32,149,141,148,172,184,150,170,172,168,162,47,217,219,242,194,227,218,231,248,245,262,-15,-68,-78,-94,-22,-43,-68,-61,-76,-77,-100,-1,-6,-2,-4,-3,2,2,3,4,2,1,9,34,-65,106,79,129,76,40,182,-41,171,8,28,-67,102,76,131,78,43,186,-39,172,-1,-1,-1,2,0,0,-1,0,1,0,-1,244,244,272,259,244,244,244,247,244,275,274,277,8.8730087837,8.4436193784,8.8990439541,10.3222709,10.995577865,8.937881722,10.132316128,10.223186425,9.986921888,9.6431441412,12.922435611,13.114557758,14.551139438,11.642561363,13.565196606,12.989721436,13.768029563,14.740408333,14.564261087,15.595702253,-4.049426827,-4.67093838,-5.652095484,-1.320290464,-2.56961874,-4.051839714,-3.635713434,-4.517221909,-4.577339199,-5.952558112,-0.357302367,-0.119767651,-0.240514701,-0.180039609,0.1195171507,0.1191717563,0.1788055787,0.2377485215,0.1188919272,0.0595255811,2.0247134137,-3.89244865,6.3736395887,4.7410430295,7.7088562209,4.5285267392,2.3840743831,10.817557728,-2.437284508,10.178874371,1.6674110466,-4.0122163,6.1331248873,4.5610034208,7.8283733716,4.6476984955,2.5628799619,11.05530625,-2.318392581,10.238399952 +050,3,6,47,141,Tennessee,Putnam County,72321,72340,72552,73071,73540,74106,74946,75091,75984,77246,78596,79957,80929,212,519,469,566,840,145,893,1262,1350,1361,972,232,905,867,865,926,857,901,890,903,867,909,147,648,769,761,773,855,850,803,796,877,842,85,257,98,104,153,2,51,87,107,-10,67,14,189,197,344,270,251,127,132,146,55,45,109,76,184,132,419,-97,714,1040,1093,1318,861,123,265,381,476,689,154,841,1172,1239,1373,906,4,-3,-10,-14,-2,-11,1,3,4,-2,-1,2715,2715,2833,2849,2754,2882,2903,2761,2708,2756,2567,2496,12.429355253,11.827216239,11.717215502,12.425193892,11.423848784,11.927850405,11.616524179,11.58866031,10.936406123,11.299926656,8.899693043,10.490345199,10.308440459,10.372219091,11.397188693,11.252689062,10.48097631,10.215474647,11.062546909,10.467038773,3.52966221,1.3368710397,1.408775043,2.0529748007,0.0266600905,0.6751613437,1.1355478692,1.3731856624,-0.126140786,0.8328878833,2.5957438042,2.6873836206,4.659794373,3.6228967072,3.3458413591,1.6812841304,1.7229002154,1.8736925861,0.6937743215,0.5594023097,1.0437911594,2.5100435847,1.7880606315,5.6221989641,-1.29301439,9.4522588118,13.574365333,14.027027374,16.625355559,10.703230859,3.6395349636,5.1974272053,6.4478550045,9.2450956713,2.0528269693,11.133542942,15.297265549,15.90071996,17.319129881,11.262633169 +050,3,6,47,143,Tennessee,Rhea County,31809,31804,31860,32088,32378,32545,32648,32402,32530,32709,32933,33206,33443,56,228,290,167,103,-246,128,179,224,273,237,95,384,374,393,391,377,397,396,388,378,376,58,354,336,363,398,435,419,441,422,426,425,37,30,38,30,-7,-58,-22,-45,-34,-48,-49,2,24,10,33,40,40,36,34,21,23,21,22,172,240,107,75,-227,116,192,237,298,264,24,196,250,140,115,-187,152,226,258,321,285,-5,2,2,-3,-5,-1,-2,-2,0,0,1,924,924,978,1007,996,960,850,876,835,836,830,826,12.009757928,11.603015543,12.106649415,11.995152854,11.591083782,12.22817717,12.139977621,11.821699522,11.430472187,11.282989992,11.07149559,10.424099525,11.182477704,12.209899836,13.37432744,12.905809154,13.519520532,12.857621645,12.881960719,12.753379646,0.9382623381,1.1789160177,0.9241717111,-0.214746982,-1.783243659,-0.677631984,-1.379542911,-1.035922123,-1.451488532,-1.470389653,0.7506098705,0.3102410573,1.0165888822,1.2271256116,1.2298232129,1.1088523378,1.0423213109,0.6398342525,0.6955049215,0.6301669943,5.3793707387,7.4457853752,3.2962124363,2.3008605218,-6.979246733,3.5729686441,5.8860497555,7.2209865635,9.0113246345,7.9220993563,6.1299806092,7.7560264325,4.3128013185,3.5279861335,-5.74942352,4.681820982,6.9283710664,7.8608208159,9.7068295559,8.5522663506 +050,3,6,47,145,Tennessee,Roane County,54181,54209,54173,53996,53628,53175,52870,52799,52988,53039,53313,53476,53841,-36,-177,-368,-453,-305,-71,189,51,274,163,365,137,510,477,488,446,442,489,441,492,464,463,129,696,653,732,707,713,723,748,816,749,803,8,-186,-176,-244,-261,-271,-234,-307,-324,-285,-340,2,12,15,13,-2,-4,-21,-18,-17,-24,-15,-38,0,-202,-217,-28,209,444,377,616,472,725,-36,12,-187,-204,-30,205,423,359,599,448,710,-8,-3,-5,-5,-14,-5,0,-1,-1,0,-5,646,646,695,681,674,658,672,717,746,788,810,730,9.4296887278,8.8641938601,9.1383200846,8.4115234099,8.3657458668,9.2449922958,8.3186358192,9.2522942681,8.6900336177,8.6286422468,12.868751676,12.134839813,13.707480127,13.333961997,13.494970143,13.668976339,14.109613589,15.345268542,14.027662025,14.965010203,-3.439062948,-3.270645953,-4.569160042,-4.922438587,-5.129224276,-4.423984043,-5.79097777,-6.092974274,-5.337628407,-6.336367957,0.2218750289,0.2787482346,0.2434388547,-0.037719836,-0.075708107,-0.397024209,-0.339536156,-0.319693095,-0.449484497,-0.279545645,0,-3.753809559,-4.063556267,-0.528077703,3.9557486112,8.3942261336,7.1113961538,11.584173311,8.8398617835,13.511372849,0.2218750289,-3.475061325,-3.820117412,-0.565797539,3.8800405038,7.9972019246,6.7718599979,11.264480217,8.3903772861,13.231827204 +050,3,6,47,147,Tennessee,Robertson County,66283,66312,66314,66775,66809,67423,68063,68709,69439,70342,71159,71693,72275,2,461,34,614,640,646,730,903,817,534,582,197,887,955,871,872,886,891,840,935,853,891,191,602,629,618,576,673,669,685,703,712,725,6,285,326,253,296,213,222,155,232,141,166,1,60,13,65,59,65,52,66,41,44,32,0,118,-301,301,287,373,455,678,542,347,383,1,178,-288,366,346,438,507,744,583,391,415,-5,-2,-4,-5,-2,-5,1,4,2,2,1,703,703,783,794,891,870,948,942,913,954,970,913,13.329426173,14.298119535,12.977531438,12.872178675,12.95586816,12.899209543,12.018800838,13.215454308,11.942429927,12.377750611,9.0465778539,9.4172954845,9.2079384945,8.5027235286,9.8411955663,9.685265078,9.8010459218,9.9363255383,9.9683588609,10.071682596,4.2828483195,4.8808240508,3.7695929436,4.3694551467,3.1146725938,3.2139444654,2.2177549166,3.2791287694,1.9740710666,2.3060680151,0.9016522778,0.1946340879,0.9684724954,0.8709386948,0.9504869418,0.7528158207,0.9443343516,0.5795012049,0.6160221768,0.4445432318,1.7732494797,-4.506527728,4.4847726325,4.2366000915,5.4543327582,6.5871384312,9.7008892482,7.6607232458,4.8581748943,5.320626806,2.6749017575,-4.31189364,5.4532451278,5.1075387863,6.4048196999,7.339954252,10.6452236,8.2402244507,5.4741970711,5.7651700378 +050,3,6,47,149,Tennessee,Rutherford County,262604,262593,263721,269206,274482,281277,289014,298401,307724,316777,324809,332125,339261,1128,5485,5276,6795,7737,9387,9323,9053,8032,7316,7136,934,3686,3653,3655,3860,3979,4142,4007,4107,4205,4254,324,1586,1621,1660,1620,1828,1853,2035,2123,2176,2322,610,2100,2032,1995,2240,2151,2289,1972,1984,2029,1932,43,509,430,608,546,638,417,530,613,145,132,453,2859,2759,4105,4828,6506,6583,6513,5419,5148,5081,496,3368,3189,4713,5374,7144,7000,7043,6032,5293,5213,22,17,55,87,123,92,34,38,16,-6,-9,5109,5110,5167,5240,4965,5043,5138,4935,5124,5265,5139,5136,13.833039047,13.437854063,13.153183304,13.536948681,13.547491978,13.667147866,12.832645584,12.802648437,12.801894863,12.672292839,5.9520347064,5.9629787672,5.9738123899,5.681310068,6.2238791995,6.1142503609,6.5172033351,6.6179748311,6.6247142026,6.9170343141,7.8810043402,7.4748752961,7.1793709144,7.8556386126,7.323612778,7.5528975046,6.3154422491,6.1846736057,6.1771806605,5.7552585249,1.9102053377,1.5817895558,2.1879987549,1.9148119118,2.1722291736,1.3759538049,1.6973551684,1.9108895768,0.4414446505,0.393216421,10.72942448,10.149203219,14.772590277,16.931706795,22.151289974,21.721592081,20.858253229,16.892513241,15.672807314,15.135853295,12.639629818,11.730992775,16.960589032,18.846518707,24.323519147,23.097545886,22.555608398,18.803402817,16.114251964,15.529069715 +050,3,6,47,151,Tennessee,Scott County,22228,22232,22226,22107,22176,22068,21994,21896,21899,21971,22036,22102,22090,-6,-119,69,-108,-74,-98,3,72,65,66,-12,69,225,285,280,282,254,281,269,280,245,251,70,261,268,271,267,289,266,285,316,248,292,-1,-36,17,9,15,-35,15,-16,-36,-3,-41,0,-2,-1,-2,-1,1,-1,2,2,1,1,-3,-79,58,-115,-90,-62,-10,87,101,68,25,-3,-81,57,-117,-91,-61,-11,89,103,69,26,-2,-2,-5,0,2,-2,-1,-1,-2,0,3,264,264,265,302,330,264,264,281,265,265,302,314,10.150452259,12.871756656,12.657083446,12.80014525,11.574390522,12.832515127,12.263505813,12.725248256,11.101545154,11.359522085,11.77452462,12.103967663,12.250248621,12.11928646,13.169286853,12.147505423,12.992933668,14.361351603,11.237482441,13.21506155,-1.624072361,0.7677889935,0.4068348251,0.6808587899,-1.594896332,0.6850097043,-0.729427855,-1.636103347,-0.135937288,-1.855539464,-0.090226242,-0.045164058,-0.090407739,-0.045390586,0.0455684666,-0.045667314,0.0911784819,0.0908946304,0.0453124292,0.0452570601,-3.563936571,2.6195153897,-5.198444987,-4.085152739,-2.825244931,-0.456673136,3.9662639617,4.5901788352,3.0812451856,1.1314265025,-3.654162813,2.5743513312,-5.288852726,-4.130543325,-2.779676464,-0.50234045,4.0574424436,4.6810734656,3.1265576148,1.1766835626 +050,3,6,47,153,Tennessee,Sequatchie County,14112,14117,14124,14272,14349,14537,14636,14641,14748,14766,14919,15071,15176,7,148,77,188,99,5,107,18,153,152,105,40,154,164,134,146,164,149,171,165,171,173,19,149,148,140,170,169,164,162,152,175,183,21,5,16,-6,-24,-5,-15,9,13,-4,-10,-1,-1,-2,-1,-1,0,-4,-2,-2,-3,-2,-12,143,65,191,125,11,127,11,142,161,117,-13,142,63,190,124,11,123,9,140,158,115,-1,1,-2,4,-1,-1,-1,0,0,-2,0,188,188,208,190,190,181,189,189,188,177,188,188,10.846598112,11.460116698,9.277850862,10.009255133,11.203333675,10.139848243,11.587721082,11.116725619,11.403801267,11.43915099,10.494435836,10.342056532,9.69327702,11.654612141,11.544898726,11.160638334,10.977841025,10.240862388,11.670556852,12.100373591,0.3521622764,1.1180601656,-0.415426158,-1.645357008,-0.341565051,-1.020790092,0.6098800569,0.8758632306,-0.266755585,-0.661222601,-0.070432455,-0.139757521,-0.069237693,-0.068556542,0,-0.272210691,-0.135528902,-0.134748189,-0.200066689,-0.13224452,10.071841104,4.5421194228,13.224399363,8.569567751,0.7514431123,8.6426894416,0.7454089585,9.5671214418,10.736912304,7.7363044269,10.001408649,4.4023619021,13.15516167,8.501011209,0.7514431123,8.3704787506,0.6098800569,9.4323732525,10.536845615,7.6040599068 +050,3,6,47,155,Tennessee,Sevier County,89889,89712,89921,91201,92385,93515,94716,95492,96613,97544,98231,98402,99244,209,1280,1184,1130,1201,776,1121,931,687,171,842,257,1044,1021,1038,1040,1034,1103,1058,1061,1043,1041,247,884,865,950,993,1066,982,1126,1081,1130,1146,10,160,156,88,47,-32,121,-68,-20,-87,-105,33,168,170,201,142,164,157,253,316,104,101,166,950,839,832,996,647,845,745,392,153,849,199,1118,1009,1033,1138,811,1002,998,708,257,950,0,2,19,9,16,-3,-2,1,-1,1,-3,982,982,1061,1117,1139,1130,1040,1131,1148,1164,1062,1180,11.528141253,11.122852505,11.167294244,11.050252084,10.87230821,11.483303402,10.898396658,10.838973311,10.608595709,10.533985003,9.7613763099,9.4233765102,10.220548682,10.550865692,11.208781965,10.223575649,11.598860716,11.04328949,11.493492954,11.596490695,1.766764943,1.6994759949,0.9467455621,0.4993863923,-0.336473755,1.2597277531,-0.700464057,-0.204316179,-0.884897245,-1.062505692,1.8551031901,1.8519930714,2.1624529317,1.5087844191,1.7244279946,1.634522787,2.6061383314,3.2281956327,1.0578082011,1.0220292847,10.490166849,9.140130511,8.951048951,10.582741419,6.8030787349,8.797272325,7.6742018058,4.004597114,1.5561986035,8.5911174524,12.345270039,10.992123582,11.113501883,12.091525838,8.5275067295,10.431795112,10.280340137,7.2327927468,2.6140068046,9.6131467371 +050,3,6,47,157,Tennessee,Shelby County,927644,927682,928475,933321,939421,938713,937949,937598,936716,936012,937239,937070,936017,793,4846,6100,-708,-764,-351,-882,-704,1227,-169,-1053,3284,13740,14113,13772,13834,13695,13370,13171,13256,12836,12832,1746,7541,7477,7948,7825,8051,8003,8230,8428,8548,9204,1538,6199,6636,5824,6009,5644,5367,4941,4828,4288,3628,204,1613,1248,1524,1201,1617,1331,1552,1687,609,521,-926,-2956,-1597,-8199,-8065,-7627,-7585,-7207,-5288,-5086,-5241,-722,-1343,-349,-6675,-6864,-6010,-6254,-5655,-3601,-4477,-4720,-23,-10,-187,143,91,15,5,10,0,20,39,18329,18323,18032,17860,17454,16977,17311,17449,17227,17878,17356,17362,14.759941476,15.072017395,14.665620238,14.743198296,14.603739602,14.26655299,14.066111042,14.152935191,13.696781054,13.701445795,8.100780107,7.9850828358,8.4637198411,8.3392747335,8.5852287359,8.5396577094,8.789316975,8.9982602438,9.1212281433,9.8276268,6.6591613689,7.0869345591,6.2019003969,6.4039235622,6.0185108664,5.7268952801,5.2767940673,5.1546749475,4.5755529104,3.8738189951,1.7327354877,1.3328050527,1.6228873978,1.2799321348,1.7242969651,1.4202529565,1.6574750845,1.8011467764,0.6498394875,0.5563009086,-3.175428457,-1.705520568,-8.731006414,-8.595048016,-8.133093972,-8.093627855,-7.696793127,-5.645799735,-5.427066722,-5.596109524,-1.44269297,-0.372715516,-7.108119016,-7.315115881,-6.408797007,-6.673374899,-6.039318043,-3.844652959,-4.777227234,-5.039808615 +050,3,6,47,159,Tennessee,Smith County,19166,19150,19127,19211,19185,19123,19104,19316,19542,19743,19946,20115,20285,-23,84,-26,-62,-19,212,226,201,203,169,170,60,211,216,231,248,209,240,256,193,230,216,72,219,222,221,210,203,196,200,229,226,241,-12,-8,-6,10,38,6,44,56,-36,4,-25,0,-1,-1,-1,0,2,1,-1,-1,-2,-3,-11,94,-16,-72,-54,202,180,145,239,168,198,-11,93,-17,-73,-54,204,181,144,238,166,195,0,-1,-3,1,-3,2,1,1,1,-1,0,159,159,234,235,236,230,236,236,236,236,236,236,11.007355626,11.251171997,12.060144095,12.975122296,10.87975013,12.352668691,13.032964236,9.7256166696,11.482489204,10.693069307,11.424696124,11.563704553,11.538059935,10.986998718,10.567412806,10.088012764,10.182003309,11.539721333,11.28279374,11.930693069,-0.417340498,-0.312532555,0.52208416,1.9881235776,0.3123373243,2.2646559267,2.8509609266,-1.814104664,0.1996954644,-1.237623762,-0.052167562,-0.052088759,-0.052208416,0,0.1041124414,0.0514694529,-0.050910017,-0.050391796,-0.099847732,-0.148514851,4.9037508477,-0.833420148,-3.759005952,-2.825228242,10.515356585,9.2645015183,7.3819523991,12.043639296,8.3872095055,9.801980198,4.8515832855,-0.885508907,-3.811214368,-2.825228242,10.619469027,9.3159709712,7.3310423826,11.993247499,8.2873617733,9.6534653465 +050,3,6,47,161,Tennessee,Stewart County,13324,13311,13347,13223,13309,13277,13211,13193,13191,13424,13594,13699,13859,36,-124,86,-32,-66,-18,-2,233,170,105,160,35,135,130,125,136,125,135,146,132,152,143,32,149,154,159,171,174,153,151,154,180,192,3,-14,-24,-34,-35,-49,-18,-5,-22,-28,-49,4,1,26,6,3,1,-5,-2,0,-6,-3,29,-112,82,-3,-31,31,20,239,194,139,214,33,-111,108,3,-28,32,15,237,194,133,211,0,1,2,-1,-3,-1,1,1,-2,0,-2,92,92,87,87,72,88,87,119,145,142,142,153,10.161836658,9.7994874114,9.4034454224,10.268800966,9.4682623845,10.233474833,10.97125681,9.771263602,11.138387132,10.378111619,11.215656756,11.608623549,11.961182577,12.911507098,13.179821239,11.597938144,11.346984783,11.399807536,13.190195288,13.934247768,-1.053820098,-1.809136137,-2.557737155,-2.642706131,-3.711558855,-1.364463311,-0.375727973,-1.628543934,-2.051808156,-3.556136149,0.0752728641,1.9598974823,0.4513653803,0.2265176684,0.0757460991,-0.379017586,-0.150291189,0,-0.439673176,-0.217722621,-8.430560783,6.1812151364,-0.22568269,-2.340682573,2.3481290714,1.5160703457,17.959797107,14.360796506,10.185761917,15.530880325,-8.355287919,8.1411126187,0.2256826901,-2.114164905,2.4238751704,1.1370527592,17.809505918,14.360796506,9.7460887407,15.313157704 +050,3,6,47,163,Tennessee,Sullivan County,156823,156804,156756,156895,156367,156258,156509,156336,156372,157154,157785,158469,158755,-48,139,-528,-109,251,-173,36,782,631,684,286,395,1551,1522,1630,1578,1531,1526,1538,1473,1519,1491,483,1955,1969,2100,1987,2060,2076,2083,2132,2117,2144,-88,-404,-447,-470,-409,-529,-550,-545,-659,-598,-653,7,17,2,19,-6,16,14,42,45,-1,10,57,533,-45,363,684,360,583,1288,1244,1284,931,64,550,-43,382,678,376,597,1330,1289,1283,941,-24,-7,-38,-21,-18,-20,-11,-3,1,-1,-2,2631,2630,2599,2554,2517,2526,2525,2581,2633,2698,2813,2710,9.8899732505,9.7171058092,10.427828868,10.09057861,9.7875944957,9.759903808,9.8109885624,9.3541923992,9.6062026093,9.4002975815,12.466084916,12.570947003,13.43462615,12.705944041,13.169460915,13.277562454,13.287574236,13.5391298,13.387972958,13.51726225,-2.576111666,-2.853841194,-3.006797281,-2.615365432,-3.381866419,-3.517658646,-3.476585674,-4.184937401,-3.781770349,-4.116964668,0.1084007384,0.0127688644,0.1215513794,-0.038367219,0.1022870751,0.0895404019,0.2679203639,0.2857696252,-0.006324031,0.0630469321,3.3986819746,-0.287299449,2.3222710916,4.3738629715,2.3014591891,3.7287181652,8.2162244917,7.8999425286,8.1200553985,5.8696693819,3.507082713,-0.274530585,2.443822471,4.3354957524,2.4037462641,3.8182585671,8.4841448556,8.1857121538,8.1137313678,5.932716314 +050,3,6,47,165,Tennessee,Sumner County,160645,160639,161226,163713,166026,168839,172380,175467,179474,184016,187854,191497,195561,587,2487,2313,2813,3541,3087,4007,4542,3838,3643,4064,470,1858,1934,1956,2114,2127,2035,2083,2240,2136,2156,298,1314,1252,1420,1384,1469,1519,1595,1728,1688,1857,172,544,682,536,730,658,516,488,512,448,299,13,125,83,96,76,154,134,177,231,55,57,391,1810,1533,2156,2690,2261,3347,3861,3091,3148,3725,404,1935,1616,2252,2766,2415,3481,4038,3322,3203,3782,11,8,15,25,45,14,10,16,4,-8,-17,1252,1252,1282,1389,1305,1282,1294,1370,1339,1383,1525,1435,11.435992602,11.730489872,11.682319741,12.390869207,12.2295147,11.466694465,11.461113098,12.047220803,11.261338444,11.140449235,8.0876718399,7.5938848605,8.4810296687,8.112092234,8.4462421697,8.5591689886,8.776032353,9.2935703337,8.8994097814,9.5954611454,3.3483207617,4.1366050118,3.2012900721,4.2787769731,3.7832725307,2.9075254761,2.685080745,2.7536504693,2.3619286624,1.5449880896,0.769375175,0.5034284692,0.5733653861,0.4454617123,0.8854467625,0.7550550655,0.9738919915,1.2423696453,0.2899689206,0.294529502,11.140552534,9.2982631718,12.876830962,15.767000079,12.999968377,18.859472419,21.24405073,16.624089063,16.596766583,19.247761317,11.90992771,9.801691641,13.450196348,16.212461791,13.885415139,19.614527485,22.217942722,17.866458709,16.886735504,19.542290819 +050,3,6,47,167,Tennessee,Tipton County,61081,61008,61067,61313,61542,61594,61625,61570,61242,61335,61601,61715,61918,59,246,229,52,31,-55,-328,93,266,114,203,201,738,759,740,749,723,709,700,676,707,688,138,521,485,525,533,596,604,664,618,613,651,63,217,274,215,216,127,105,36,58,94,37,3,49,41,50,35,18,2,8,8,-6,-2,-6,-20,-83,-212,-220,-199,-436,52,203,26,164,-3,29,-42,-162,-185,-181,-434,60,211,20,162,-1,0,-3,-1,0,-1,1,-3,-3,0,4,962,962,1002,962,965,962,962,991,997,1043,1044,1024,12.060794247,12.356029466,12.019230769,12.157216014,11.737489346,11.546102987,11.421392268,10.997592243,11.46647637,11.129714558,8.5144631476,7.8954865492,8.5271569647,8.651263198,9.6757173587,9.836172361,10.83400638,10.054011844,9.9419377859,10.531168863,3.5463310999,4.4605429164,3.4920738046,3.5059528157,2.0617719875,1.7099306257,0.5873858881,0.9435803996,1.5245385838,0.5985456957,0.8007844419,0.6674535021,0.8121101871,0.5680942063,0.2922196518,0.0325701072,0.1305301973,0.1301490206,-0.097310973,-0.032353821,-0.326850793,-1.351186358,-3.443347193,-3.570877868,-3.230650595,-7.10028336,0.8484462827,3.3025313985,0.4216808849,2.653013354,0.4739336493,-0.683732856,-2.631237006,-3.002783662,-2.938430943,-7.067713253,0.9789764801,3.4326804191,0.3243699114,2.6206595326 +050,3,6,47,169,Tennessee,Trousdale County,7870,7858,7868,7812,7795,7814,8001,8053,9955,10833,11030,11277,11455,10,-56,-17,19,187,52,1902,878,197,247,178,19,89,91,83,97,112,97,101,116,124,124,8,92,90,92,87,110,97,113,92,86,82,11,-3,1,-9,10,2,0,-12,24,38,42,1,-1,2,6,4,1,-2,-3,-2,-5,-2,-1,-52,-20,23,168,49,1883,881,174,215,138,0,-53,-18,29,172,50,1881,878,172,210,136,-1,0,0,-1,5,0,21,12,1,-1,0,130,130,134,137,138,131,140,1807,2593,2629,2616,2612,11.352040816,11.661433972,10.634890127,12.266835283,13.952908932,10.772989782,9.7171445064,10.611535471,11.117586408,10.909730776,11.734693878,11.533286346,11.788070985,11.002213089,13.703749844,10.772989782,10.871656725,8.4160453735,7.7105841216,7.2144993841,-0.382653061,0.1281476261,-1.153180857,1.2646221941,0.2491590881,0,-1.154512219,2.1954900974,3.4070022863,3.6952313919,-0.12755102,0.2562952521,0.7687872381,0.5058488776,0.124579544,-0.222123501,-0.288628055,-0.182957508,-0.448289775,-0.1759634,-6.632653061,-2.562952521,2.9470177462,21.245652861,6.1043976579,209.12927588,84.760438715,15.917303206,19.276460304,12.141474573,-6.760204082,-2.306657269,3.7158049843,21.751501739,6.2289772019,208.90715238,84.47181066,15.734345698,18.828170529,11.965511174 +050,3,6,47,171,Tennessee,Unicoi County,18313,18311,18283,18303,18256,18102,17957,17830,17736,17833,17867,17914,17755,-28,20,-47,-154,-145,-127,-94,97,34,47,-159,30,167,158,167,156,157,143,166,166,161,155,42,256,234,273,277,292,274,295,290,296,295,-12,-89,-76,-106,-121,-135,-131,-129,-124,-135,-140,3,18,8,9,-7,11,13,37,27,25,22,-17,91,24,-53,-15,-2,27,190,133,158,-41,-14,109,32,-44,-22,9,40,227,160,183,-19,-2,0,-3,-4,-2,-1,-3,-1,-2,-1,0,405,405,405,419,437,439,426,452,436,437,452,453,9.1291750943,8.6435624607,9.1864238957,8.6524862032,8.7741358594,8.0413878423,9.3339705924,9.299719888,8.999189514,8.6910202136,13.994424097,12.801225416,15.017327686,15.363709476,16.318774974,15.407973908,16.58747786,16.246498599,16.545093765,16.540973955,-4.865249002,-4.157662956,-5.83090379,-6.711223273,-7.544639115,-7.366586065,-7.253507268,-6.946778711,-7.545904251,-7.849953741,0.9839829443,0.4376487322,0.4950767369,-0.388252586,0.6147483723,0.7310352584,2.0804633248,1.512605042,1.3973896761,1.2335641594,4.9745804406,1.3129461966,-2.915451895,-0.831969827,-0.111772431,1.5183039982,10.683460317,7.4509803922,8.8315027529,-2.298915024,5.9585633849,1.7505949287,-2.420375158,-1.220222413,0.502975941,2.2493392566,12.763923641,8.9635854342,10.228892429,-1.065350865 +050,3,6,47,173,Tennessee,Union County,19109,19108,19118,19193,19107,19064,18992,19159,19222,19394,19651,19936,20187,10,75,-86,-43,-72,167,63,172,257,285,251,50,210,221,228,158,206,220,199,216,209,210,19,193,199,212,255,208,235,222,233,213,235,31,17,22,16,-97,-2,-15,-23,-17,-4,-25,0,-6,-2,-1,5,7,3,-2,-1,-2,-1,-20,65,-107,-55,25,160,74,198,273,290,278,-20,59,-109,-56,30,167,77,196,272,288,277,-1,-1,1,-3,-5,2,1,-1,2,1,-1,152,152,152,156,164,156,152,153,165,168,173,171,10.962908825,11.540469974,11.946241911,8.3035526592,10.799192682,11.464005628,10.30660866,11.064156742,10.559021901,10.46781148,10.075435254,10.391644909,11.107909146,13.401303342,10.904039213,12.245642375,11.497824736,11.934946856,10.761108445,11.713979513,0.8874735716,1.1488250653,0.8383327657,-5.097750683,-0.104846531,-0.781636747,-1.191216076,-0.870790114,-0.202086544,-1.246168033,-0.313225966,-0.104438642,-0.052395798,0.2627706538,0.3669628581,0.1563273495,-0.103584007,-0.051222948,-0.101043272,-0.049846721,3.393281303,-5.587467363,-2.881768882,1.3138532689,8.3877224712,3.8560746203,10.254816656,13.983864771,14.651274408,13.85738853,3.0800553366,-5.691906005,-2.93416468,1.5766239226,8.7546853293,4.0124019697,10.15123265,13.932641824,14.550231136,13.807541809 +050,3,6,47,175,Tennessee,Van Buren County,5548,5556,5567,5555,5652,5573,5696,5697,5721,5747,5777,5874,5947,11,-12,97,-79,123,1,24,26,30,97,73,13,57,47,63,61,68,66,64,72,69,68,6,56,56,65,79,78,85,71,91,80,67,7,1,-9,-2,-18,-10,-19,-7,-19,-11,1,0,0,0,0,0,0,0,0,0,0,0,3,-12,103,-79,137,13,42,35,50,108,73,3,-12,103,-79,137,13,42,35,50,108,73,1,-1,3,2,4,-2,1,-2,-1,0,-1,94,94,115,115,94,136,95,115,136,115,124,136,10.249955044,8.3876148836,11.224944321,10.826160263,11.937154393,11.560693642,11.16149285,12.495661229,11.844476869,11.50494882,10.070131271,9.9937539038,11.581291759,14.02076493,13.692618274,14.888772114,12.38228113,15.793127386,13.732726805,11.335758396,0.1798237727,-1.60613902,-0.356347439,-3.194604668,-1.755463881,-3.328078473,-1.22078828,-3.297466158,-1.888249936,0.1691904238,0,0,0,0,0,0,0,0,0,0,-2.157885272,18.381368787,-14.07572383,24.314491082,2.2821030457,7.3568050447,6.1039414022,8.67754252,18.539181186,12.350900939,-2.157885272,18.381368787,-14.07572383,24.314491082,2.2821030457,7.3568050447,6.1039414022,8.67754252,18.539181186,12.350900939 +050,3,6,47,177,Tennessee,Warren County,39839,39824,39859,39910,39757,39883,39993,40271,40424,40698,40859,41269,41605,35,51,-153,126,110,278,153,274,161,410,336,111,510,443,499,489,455,468,500,485,478,496,78,523,439,475,475,478,504,511,517,526,508,33,-13,4,24,14,-23,-36,-11,-32,-48,-12,-2,31,13,54,44,40,17,45,18,25,25,8,36,-167,55,59,264,174,241,176,434,323,6,67,-154,109,103,304,191,286,194,459,348,-4,-3,-3,-7,-7,-3,-2,-1,-1,-1,0,580,580,580,580,559,580,582,583,599,596,572,542,12.786922238,11.12129238,12.531391261,12.243978166,11.337585966,11.599231675,12.327112251,11.893522322,11.640366258,11.969978522,13.112863393,11.02087439,11.928679056,11.893434824,11.910694707,12.491480265,12.59830872,12.678249568,12.809273329,12.259574776,-0.325941155,0.1004179899,0.6027122049,0.3505433422,-0.573108741,-0.89224859,-0.27119647,-0.784727246,-1.168907072,-0.289596255,0.7772442929,0.3263584671,1.3561024611,1.1017076469,0.9967108542,0.4213396121,1.1094401026,0.4414090759,0.6088057666,0.6033255303,0.9026062756,-4.192451078,1.3812154696,1.4772897992,6.5782916376,4.3125348535,5.9416681048,4.3159998529,10.568868108,7.7949658518,1.6798505685,-3.86609261,2.7373179307,2.578997446,7.5750024918,4.7338744656,7.0511082074,4.7574089287,11.177673875,8.3982913821 +050,3,6,47,179,Tennessee,Washington County,122979,123063,123393,123910,124914,125454,125821,126238,127439,127869,129025,129670,130367,330,517,1004,540,367,417,1201,430,1156,645,697,356,1315,1352,1370,1312,1317,1335,1279,1216,1242,1231,299,1284,1315,1391,1305,1440,1392,1500,1489,1451,1500,57,31,37,-21,7,-123,-57,-221,-273,-209,-269,7,69,84,137,132,215,207,230,280,104,82,255,417,864,434,255,335,1050,425,1147,749,881,262,486,948,571,387,550,1257,655,1427,853,963,11,0,19,-10,-27,-10,1,-4,2,1,3,4649,4649,4449,4447,4323,4222,4176,4245,4205,4578,4282,4046,10.63472744,10.867118927,10.943890593,10.442742016,10.449934341,10.525195426,10.019270841,9.4669396716,9.6020410135,9.4678834166,10.384022838,10.569719963,11.111643661,10.387026167,11.425896318,10.974585792,11.750513106,11.59232991,11.217843406,11.53681976,0.2507046012,0.2973989647,-0.167753067,0.0557158492,-0.975961977,-0.449390366,-1.731242264,-2.125390239,-1.615802393,-2.068936344,0.5580199189,0.675176028,1.0943890593,1.0506417272,1.7059497975,1.6319965941,1.8017453429,2.1798874244,0.8040356404,0.6306794802,3.3723812489,6.9446677169,3.466896728,2.0296487912,2.658107824,8.2782435932,3.3293120466,8.9297531277,5.7906028335,6.7759588059,3.9304011678,7.619843745,4.5612857873,3.0802905184,4.3640576214,9.9102401873,5.1310573895,11.109640552,6.5946384739,7.4066382861 +050,3,6,47,181,Tennessee,Wayne County,17021,17021,16981,16997,16972,16918,16857,16765,16754,16637,16633,16644,16524,-40,16,-25,-54,-61,-92,-11,-117,-4,11,-120,33,129,158,149,146,144,144,126,144,118,123,67,183,157,217,204,225,202,227,200,201,217,-34,-54,1,-68,-58,-81,-58,-101,-56,-83,-94,0,1,0,2,1,1,1,1,0,0,1,-5,69,-24,16,-3,-10,47,-16,52,95,-28,-5,70,-24,18,-2,-9,48,-15,52,95,-27,-1,0,-2,-4,-1,-2,-1,-1,0,-1,1,2140,2140,2198,2196,2209,2219,2254,2234,2243,2223,2240,2235,7.5931485079,9.3025994289,8.7931543228,8.6454478164,8.5658199988,8.5921417703,7.5469437872,8.6564472498,7.0919854554,7.4167872648,10.77167579,9.2437222173,12.806137504,12.079940785,13.384093748,12.052865539,13.596478093,12.022843402,12.080415903,13.08490111,-3.178527282,0.0588772116,-4.012983181,-3.434492968,-4.818273749,-3.460723769,-6.049534306,-3.366396153,-4.988430447,-5.668113845,0.0588616163,0,0.1180289171,0.059215396,0.0594848611,0.0596676512,0.0598963793,0,0,0.0602990835,4.0614515275,-1.413053078,0.9442313367,-0.177646188,-0.594848611,2.8043796056,-0.958342068,3.1259392846,5.7096493073,-1.688374337,4.1203131438,-1.413053078,1.0622602538,-0.118430792,-0.53536375,2.8640472568,-0.898445689,3.1259392846,5.7096493073,-1.628075253 +050,3,6,47,183,Tennessee,Weakley County,35021,35015,35044,34860,34556,34154,34003,33875,33591,33323,33368,33269,33334,29,-184,-304,-402,-151,-128,-284,-268,45,-99,65,104,347,361,340,367,351,335,333,298,344,318,55,378,372,420,335,384,385,401,396,388,400,49,-31,-11,-80,32,-33,-50,-68,-98,-44,-82,1,10,10,20,29,50,27,40,43,23,19,-19,-162,-311,-348,-214,-143,-262,-240,102,-79,127,-18,-152,-301,-328,-185,-93,-235,-200,145,-56,146,-2,-1,8,6,2,-2,1,0,-2,1,1,2244,2244,2181,2123,2008,1844,1807,1787,1625,1652,1551,1638,9.9279011215,10.401060274,9.8966671518,10.769253342,10.342084328,9.9309281712,9.9530740951,8.9367380906,10.324594445,9.549119409,10.814831769,10.717990089,12.225294717,9.8302448758,11.314417042,11.413156256,11.98553367,11.875665382,11.645182106,12.011470955,-0.886930648,-0.316929814,-2.328627565,0.9390084657,-0.972332715,-1.482228085,-2.032459575,-2.938927292,-1.320587662,-2.462351546,0.2861066606,0.2881180131,0.5821568913,0.8509764221,1.4732313857,0.800403166,1.1955644559,1.2895293218,0.6903071867,0.5705448704,-4.634927901,-8.960470209,-10.12952991,-6.279619115,-4.213441763,-7.766875167,-7.173386735,3.0588835075,-2.37105512,3.8136420281,-4.348821241,-8.672352195,-9.547373017,-5.428642693,-2.740210377,-6.966472001,-5.977822279,4.3484128293,-1.680747933,4.3841868985 +050,3,6,47,185,Tennessee,White County,25841,25847,25833,26058,26043,26207,26279,26363,26473,26780,27099,27378,27707,-14,225,-15,164,72,84,110,307,319,279,329,77,281,310,293,327,299,288,302,290,299,285,103,337,375,338,408,340,380,357,397,362,369,-26,-56,-65,-45,-81,-41,-92,-55,-107,-63,-84,0,8,8,7,8,9,2,2,3,2,1,15,272,46,201,145,120,200,359,423,340,414,15,280,54,208,153,129,202,361,426,342,415,-3,1,-4,1,0,-4,0,1,0,0,-2,382,382,413,387,391,403,347,382,387,392,384,392,10.830394481,11.899963532,11.215311005,12.460465648,11.359750769,10.90165796,11.342084014,10.764862006,10.977109606,10.347644549,12.988764911,14.395117176,12.937799043,15.54700301,12.917442346,14.384132031,13.407695341,14.736724884,13.290012299,13.397476627,-2.15837043,-2.495153644,-1.722488038,-3.086537362,-1.557691577,-3.482474071,-2.065611327,-3.971862878,-2.312902693,-3.049832078,0.3083386329,0.3070958331,0.2679425837,0.3048431963,0.3419322974,0.0757059581,0.0751131392,0.1113606414,0.0734254823,0.0363075247,10.483513519,1.7658010403,7.6937799043,5.5252829326,4.5590972987,7.5705958059,13.48280848,15.701850443,12.482331993,15.03131524,10.791852152,2.0728968734,7.961722488,5.8301261289,4.9010295961,7.6463017639,13.557921619,15.813211084,12.555757476,15.067622765 +050,3,6,47,187,Tennessee,Williamson County,183182,183208,184082,188464,193207,199177,205395,211713,219105,226373,232517,238556,245348,874,4382,4743,5970,6218,6318,7392,7268,6144,6039,6792,490,1962,2008,2018,2084,2223,2258,2380,2342,2293,2310,175,990,981,985,1058,1103,1223,1296,1334,1409,1501,315,972,1027,1033,1026,1120,1035,1084,1008,884,809,61,394,367,466,360,547,505,561,687,189,159,485,3007,3294,4406,4748,4619,5839,5624,4464,4987,5860,546,3401,3661,4872,5108,5166,6344,6185,5151,5176,6019,13,9,55,65,84,32,13,-1,-15,-21,-36,1153,1153,1182,1236,1180,1239,1209,1181,1206,1182,1242,1181,10.532927477,10.522151277,10.28584244,10.302245336,10.659109871,10.482384673,10.68515168,10.207239208,9.7352215049,9.5473482344,5.3147799198,5.1405529894,5.0205920731,5.2302186014,5.288798105,5.6775715035,5.81846915,5.814029506,5.9820877019,6.2037098267,5.2181475576,5.3815982875,5.265250367,5.0720267344,5.3703117658,4.8048131694,4.8666825298,4.3932097017,3.753133803,3.3436384076,2.1151750388,1.9231222702,2.3752242701,1.7796585033,2.622821907,2.3443774401,2.5186428959,2.9941816122,0.8024234036,0.6571551382,16.142972948,17.260939395,22.457592562,23.47171826,22.147741113,27.106574006,25.249282793,19.455642965,21.172939226,24.219679937,18.258147987,19.184061666,24.832816832,25.251376764,24.77056302,29.450951446,27.767925689,22.449824577,21.97536263,24.876835075 +050,3,6,47,189,Tennessee,Wilson County,113993,114063,114681,116814,119172,122033,125253,128610,132649,136824,140909,144507,148130,618,2133,2358,2861,3220,3357,4039,4175,4085,3598,3623,333,1306,1363,1345,1454,1415,1558,1492,1611,1676,1669,150,886,939,942,1052,1080,1066,1035,1194,1170,1312,183,420,424,403,402,335,492,457,417,506,357,14,149,88,96,86,146,125,163,197,46,56,401,1557,1801,2327,2668,2840,3409,3538,3460,3053,3227,415,1706,1889,2423,2754,2986,3534,3701,3657,3099,3283,20,7,45,35,64,36,13,17,11,-7,-17,1232,1232,1234,1504,1384,1414,1315,1384,1566,1685,1592,1592,11.283181062,11.551532718,11.152339296,11.7596629,11.147745044,11.92686185,11.073465616,11.601070092,11.744261008,11.406623223,7.6545929718,7.9580992093,7.8107833586,8.5083668303,8.5085262523,8.1604844235,7.6816601292,8.5981860276,8.1985592959,8.9667403643,3.6285880905,3.5934335088,3.3415559379,3.2512960701,2.6392187912,3.7663774262,3.391805487,3.0028840649,3.5457017126,2.4398828583,1.2872848226,0.7458069546,0.7960033996,0.6955509006,1.1502266971,0.9569048339,1.2097686967,1.4186286829,0.3223365193,0.3827267229,13.451694421,15.263617333,19.294790738,21.57825352,22.374272738,26.09670863,26.258660422,24.916016462,21.393334641,22.054627405,14.738979244,16.009424288,20.090794138,22.273804421,23.524499435,27.053613464,27.468429119,26.334645145,21.715671161,22.437354128 +040,3,7,48,000,Texas,Texas,25145561,25146072,25241897,25645504,26084120,26479646,26963092,27468531,27914064,28291024,28624564,28986794,29360759,95825,403607,438616,395526,483446,505439,445533,376960,333540,362230,373965,92798,381711,378107,384426,394317,402268,402564,389353,381430,377278,378318,41022,168142,169190,178641,180742,187833,188784,194127,202260,203427,220988,51776,213569,208917,205785,213575,214435,213780,195226,179170,173851,157330,14908,69106,84838,79571,106776,117265,110382,96215,69138,66791,54650,27943,120571,141603,107618,159828,172183,120979,84806,84638,121411,162299,42851,189677,226441,187189,266604,289448,231361,181021,153776,188202,216949,1198,361,3258,2552,3267,1556,392,713,594,177,-314,581678,582260,586658,593059,591216,599882,599889,595799,600322,600240,590889,590686,15.002180992,14.618586828,14.627034144,14.756616699,14.780672625,14.537563652,13.854724327,13.403357969,13.097347922,12.967741766,6.6083940895,6.5413195348,6.7971157166,6.763949856,6.9016130568,6.8174486948,6.9078087735,7.1073674931,7.062044953,7.5748849313,8.3937869022,8.0772672927,7.8299184271,7.9926668428,7.879059568,7.7201149567,6.9469155533,6.2959904763,6.0353029693,5.392856835,2.7160357433,3.2800547709,3.0275988977,3.9959030542,4.3087085608,3.9861620785,3.4237113907,2.4294926023,2.3186747308,1.8732576497,4.7387368044,5.4747353277,4.094759877,5.9812803753,6.3265796796,4.368845483,3.0177339105,2.9741588543,4.2148286107,5.5631810301,7.4547725477,8.7547900986,7.1223587747,9.9771834295,10.63528824,8.3550075615,6.4414453012,5.4036514566,6.5335033415,7.4364386798 +050,3,7,48,001,Texas,Anderson County,58458,58457,58498,58404,58074,57982,57846,57665,57595,58232,58138,57816,57805,41,-94,-330,-92,-136,-181,-70,637,-94,-322,-11,149,594,570,583,587,584,640,582,629,629,578,104,642,625,616,702,613,673,677,756,718,688,45,-48,-55,-33,-115,-29,-33,-95,-127,-89,-110,2,-5,11,34,48,59,64,58,48,50,40,-3,-38,-284,-83,-54,-208,-100,667,-12,-286,55,-1,-43,-273,-49,-6,-149,-36,725,36,-236,95,-3,-3,-2,-10,-15,-3,-1,7,-3,3,4,14217,14239,14345,14176,14215,14373,14274,13850,14376,14443,14268,14250,10.162358215,9.7872559625,10.046873923,10.135718479,10.111591104,11.105327087,10.049470331,10.810346309,10.849129827,9.998183721,10.983558878,10.73164031,10.6155649,12.121421418,10.613707785,11.677945514,11.68984779,12.993039443,12.384221329,11.900952249,-0.821200664,-0.944384347,-0.568690977,-1.985702939,-0.502116682,-0.572618428,-1.640377459,-2.182693134,-1.535091502,-1.902768528,-0.085541736,0.1888768695,0.5859240367,0.8288151397,1.0215477314,1.1105327087,1.0014936068,0.8249548853,0.8624109561,0.6919158284,-0.650117192,-4.876457357,-1.430343972,-0.932417032,-3.601388612,-1.735207357,11.517176479,-0.206238721,-4.932990669,0.9513842641,-0.735658928,-4.687580487,-0.844419935,-0.103601892,-2.579840881,-0.624674649,12.518670086,0.618716164,-4.070579713,1.6433000925 +050,3,7,48,003,Texas,Andrews County,14786,14786,14849,15387,16102,16774,17424,18058,17775,17599,18063,18821,18879,63,538,715,672,650,634,-283,-176,464,758,58,58,261,285,333,332,349,299,300,321,322,325,13,124,130,120,131,127,121,124,196,176,117,45,137,155,213,201,222,178,176,125,146,208,9,0,3,21,28,32,50,17,15,27,21,10,398,535,429,411,376,-514,-370,324,587,-171,19,398,538,450,439,408,-464,-353,339,614,-150,-1,3,22,9,10,4,3,1,0,-2,0,82,82,81,82,81,77,78,79,80,78,77,77,17.264188385,18.101559275,20.257938922,19.416340137,19.671946339,16.688527335,16.961610222,18.002355448,17.46014532,17.24137931,8.2021431406,8.256851599,7.3001581701,7.6612667407,7.1585592695,6.7535511958,7.0107988918,10.992092423,9.5434334671,6.2068965517,9.0620452441,9.8447076757,12.957780752,11.755073396,12.51338707,9.9349761393,9.9508113304,7.0102630251,7.9167118534,11.034482759,0,0.1905427292,1.2775276798,1.6375226621,1.8037314695,2.7907236346,0.9611579126,0.841231563,1.4640494523,1.1140583554,26.326233629,33.980120042,26.098065458,24.036493362,21.193844766,-28.68863896,-20.91931927,18.170601761,31.829519575,-9.071618037,26.326233629,34.170662771,27.375593138,25.674016024,22.997576236,-25.89791533,-19.95816136,19.011833324,33.293569027,-7.957559682 +050,3,7,48,005,Texas,Angelina County,86771,86771,86905,87299,87511,87317,87575,87837,87661,87523,86854,86761,86796,134,394,212,-194,258,262,-176,-138,-669,-93,35,280,1241,1243,1168,1208,1198,1199,1146,1121,1137,1101,177,851,820,881,853,898,908,918,947,978,993,103,390,423,287,355,300,291,228,174,159,108,2,15,-12,26,54,66,26,11,-4,-7,-9,39,-6,-186,-507,-139,-94,-491,-375,-841,-247,-68,41,9,-198,-481,-85,-28,-465,-364,-845,-254,-77,-10,-5,-13,0,-12,-10,-2,-2,2,2,4,2953,2953,2951,2878,2810,2898,2854,2789,2751,2734,2615,2608,14.247663659,14.221154396,13.361704075,13.814239645,13.659270745,13.663973379,13.083386611,12.857200204,13.097946606,12.687474432,9.7701545315,9.3816143241,10.078477132,9.754591405,10.238752195,10.34769627,10.48040917,10.861524169,11.266307635,11.442926531,4.4775091272,4.8395400721,3.2832269431,4.0596482401,3.4205185506,3.3162771086,2.6029774409,1.9956760353,1.8316389713,1.2445479007,0.1722118895,-0.137291917,0.2974351934,0.6175239576,0.7525140811,0.2962996729,0.125582245,-0.04587761,-0.080638194,-0.103712325,-0.068884756,-2.128024713,-5.799986272,-1.589552409,-1.071762479,-5.595505362,-4.281212896,-9.645767504,-2.845376264,-0.783604234,0.1033271337,-2.265316629,-5.502551079,-0.972028452,-0.319248398,-5.299205689,-4.155630651,-9.691645114,-2.926014457,-0.887316559 +050,3,7,48,007,Texas,Aransas County,23158,23165,23189,23222,23466,23893,24573,24812,25216,25421,23283,23364,23814,24,33,244,427,680,239,404,205,-2138,81,450,69,232,245,228,295,251,291,224,230,236,219,93,322,343,344,327,370,351,336,344,351,376,-24,-90,-98,-116,-32,-119,-60,-112,-114,-115,-157,4,16,11,2,0,-7,-1,-5,-7,-3,1,41,108,315,526,689,361,464,321,-2022,201,611,45,124,326,528,689,354,463,316,-2029,198,612,3,-1,16,15,23,4,1,1,5,-2,-5,459,459,480,460,452,450,444,458,453,434,436,437,9.9976298722,10.495202193,9.6285816846,12.173482441,10.165029867,11.633485248,8.8472855817,9.4448094612,10.11854996,9.2839882996,13.876020771,14.693283071,14.52733377,13.493995791,14.984306976,14.032142,13.270928373,14.126149803,15.049199305,15.93963288,-3.878390899,-4.198080877,-4.898752085,-1.32051335,-4.819277108,-2.398656752,-4.423642791,-4.681340342,-4.930649345,-6.65564458,0.6894917153,0.4712131597,0.0844612428,0,-0.283486889,-0.039977613,-0.197484053,-0.287450723,-0.128625635,0.0423926406,4.6540690785,13.493831391,22.213306869,28.432303058,14.619823833,18.549612217,12.678476213,-83.03219448,8.617917551,25.90190343,5.3435607938,13.965044551,22.297768112,28.432303058,14.336336944,18.509634605,12.48099216,-83.3196452,8.4892919159,25.94429607 +050,3,7,48,009,Texas,Archer County,9054,9061,9118,8840,8815,8799,8842,8762,8780,8788,8778,8692,8730,57,-278,-25,-16,43,-80,18,8,-10,-86,38,21,65,69,68,69,96,81,80,103,97,73,12,63,73,81,83,77,100,97,124,138,65,9,2,-4,-13,-14,19,-19,-17,-21,-41,8,0,4,3,1,2,0,3,3,2,2,3,47,-286,-26,-2,56,-101,35,21,10,-46,27,47,-282,-23,-1,58,-101,38,24,12,-44,30,1,2,2,-2,-1,2,-1,1,-1,-1,0,56,56,56,56,57,56,55,55,51,54,53,53,7.239113487,7.8164825828,7.7211309186,7.8226857888,10.906612134,9.2349789078,9.1074681239,11.727200273,11.104751002,8.3802089312,7.0163715336,8.2696120079,9.1972294766,9.4098973981,8.7480118155,11.401208528,11.0428051,14.118182853,15.798511734,7.4618298703,0.2227419534,-0.453129425,-1.476098558,-1.587211609,2.1586003181,-2.16622962,-1.935336976,-2.39098258,-4.693760733,0.918379061,0.4454839069,0.3398470688,0.1135460429,0.2267445156,0,0.3420362558,0.3415300546,0.2277126267,0.2289639382,0.3443921479,-31.85209934,-2.945341263,-0.227092086,6.3488464373,-11.47466485,3.9904229848,2.3907103825,1.1385631333,-5.266170578,3.0995293307,-31.40661544,-2.605494194,-0.113546043,6.5755909529,-11.47466485,4.3324592407,2.7322404372,1.36627576,-5.03720664,3.4439214786 +050,3,7,48,011,Texas,Armstrong County,1901,1901,1902,1936,1953,1940,1914,1901,1838,1866,1859,1853,1869,1,34,17,-13,-26,-13,-63,28,-7,-6,16,5,18,21,29,18,19,14,23,23,14,16,2,27,28,36,29,28,43,22,27,18,27,3,-9,-7,-7,-11,-9,-29,1,-4,-4,-11,0,5,5,0,0,0,0,0,0,0,0,-2,39,19,-8,-14,-5,-34,28,-5,-1,28,-2,44,24,-8,-14,-5,-34,28,-5,-1,28,0,-1,0,2,-1,1,0,-1,2,-1,-1,54,54,54,54,54,51,53,52,54,53,50,51,9.379885357,10.799691437,14.898535834,9.3409444733,9.9606815203,7.4886333244,12.419006479,12.348993289,7.5431034483,8.5975282106,14.069828035,14.399588583,18.494734138,15.049299429,14.678899083,23.000802354,11.879049676,14.496644295,9.6982758621,14.508328855,-4.689942678,-3.599897146,-3.596198305,-5.708354956,-4.718217562,-15.51216903,0.5399568035,-2.147651007,-2.155172414,-5.910800645,2.6055237103,2.5713551041,0,0,0,0,0,0,0,0,20.32308494,9.7711493957,-4.10994092,-7.265179035,-2.621231979,-18.18668093,15.118790497,-2.684563758,-0.538793103,15.045674369,22.92860865,12.3425045,-4.10994092,-7.265179035,-2.621231979,-18.18668093,15.118790497,-2.684563758,-0.538793103,15.045674369 +050,3,7,48,013,Texas,Atascosa County,44911,44923,44964,45506,46444,47029,47730,48382,48689,49094,50325,51140,51724,41,542,938,585,701,652,307,405,1231,815,584,151,673,594,662,659,751,638,711,700,706,701,116,387,373,374,411,404,382,379,433,428,464,35,286,221,288,248,347,256,332,267,278,237,1,-12,-7,1,10,14,12,6,1,-2,0,9,270,703,297,434,292,41,71,962,541,346,10,258,696,298,444,306,53,77,963,539,346,-4,-2,21,-1,9,-1,-2,-4,1,-2,1,384,384,383,380,374,371,345,367,373,358,303,304,14.877860064,12.920065253,14.164518096,13.908969069,15.627601132,13.145017564,14.542405122,14.081815347,13.916128714,13.629646912,8.5553222063,8.1131049483,8.0023108277,8.6746377653,8.4068586649,7.870527758,7.7518587075,8.7106086362,8.4364066427,9.0216207808,6.3225378579,4.8069603045,6.1622072684,5.2343313036,7.2207424671,5.2744898064,6.790546414,5.371206711,5.4797220717,4.6080261316,-0.265281309,-0.152256661,0.021396553,0.2110617461,0.2913267854,0.2472417097,0.1227207183,0.0201168791,-0.039422461,0,5.9688294462,15.290918978,6.3547762455,9.1600797813,6.0762443816,0.8447425081,1.4521951668,19.352437663,10.663775686,6.7273292892,5.7035481375,15.138662316,6.3761727986,9.3711415275,6.367571167,1.0919842177,1.5749158852,19.372554542,10.624353225,6.7273292892 +050,3,7,48,015,Texas,Austin County,28417,28421,28372,28612,28572,28690,28975,29477,29650,29729,30000,30107,29972,-49,240,-40,118,285,502,173,79,271,107,-135,67,351,335,331,338,372,358,331,330,325,332,105,252,244,263,260,286,288,295,260,295,324,-38,99,91,68,78,86,70,36,70,30,8,13,52,42,11,21,25,30,11,0,11,6,-21,90,-174,44,186,389,76,34,203,68,-149,-8,142,-132,55,207,414,106,45,203,79,-143,-3,-1,1,-5,0,2,-3,-2,-2,-2,0,212,212,217,223,215,215,209,205,197,209,208,208,12.319247508,11.716564074,11.560895533,11.722882164,12.728392527,12.10952695,11.148722612,11.049908755,10.814048281,11.052114716,8.8445879545,8.533855624,9.1858475079,9.0176016648,9.785807158,9.7417423512,9.936172721,8.7059887157,9.8158284393,10.785798698,3.4746595536,3.1827084499,2.3750480249,2.7052804994,2.9425853692,2.3677845993,1.2125498914,2.3439200388,0.9982198413,0.2663160172,1.8250737049,1.4689423615,0.3841989452,0.7283447498,0.8554027236,1.0147648283,0.3705013557,0,0.3660139418,0.1997370129,3.1587814123,-6.085618355,1.5367957808,6.4510534987,13.310066379,2.5707375649,1.1451860085,6.7973681126,2.2626316402,-4.960135821,4.9838551172,-4.616675993,1.920994726,7.1793982485,14.165469103,3.5855023932,1.5156873642,6.7973681126,2.628645582,-4.760398808 +050,3,7,48,017,Texas,Bailey County,7165,7165,7154,7175,7139,7123,6962,7219,7138,6987,6901,6859,6697,-11,21,-36,-16,-161,257,-81,-151,-86,-42,-162,21,135,126,106,108,129,129,143,122,117,117,29,64,51,63,63,59,65,60,62,36,45,-8,71,75,43,45,70,64,83,60,81,72,4,37,43,22,33,39,0,-5,-7,-5,-1,-8,-87,-159,-81,-244,146,-146,-230,-138,-116,-231,-4,-50,-116,-59,-211,185,-146,-235,-145,-121,-232,1,0,5,0,5,2,1,1,-1,-2,-2,106,106,105,106,105,106,106,107,106,104,93,92,18.842905995,17.605141819,14.864675361,15.335463259,18.193357309,17.970328063,20.247787611,17.569124424,17.005813953,17.261729124,8.9329332124,7.1258907363,8.8346655448,8.945686901,8.3209928778,9.0548164658,8.4955752212,8.9285714286,5.2325581395,6.639126586,9.9099727825,10.479251083,6.0300098163,6.3897763578,9.8723644313,8.9155115971,11.752212389,8.6405529954,11.773255814,10.622602538,5.1643520134,6.0081039542,3.0851213014,4.6858359957,5.500317326,0,-0.707964602,-1.008064516,-0.726744186,-0.147536146,-12.14320609,-22.2160123,-11.3588557,-34.64678736,20.590931528,-20.33851083,-32.56637168,-19.87327189,-16.86046512,-34.08084981,-6.978854072,-16.20790834,-8.273734399,-29.96095137,26.091248854,-20.33851083,-33.27433628,-20.88133641,-17.5872093,-34.22838595 +050,3,7,48,019,Texas,Bandera County,20485,20473,20546,20526,20579,20543,20800,21127,21678,22312,22816,23181,23861,73,-20,53,-36,257,327,551,634,504,365,680,40,170,181,155,141,161,159,200,191,163,170,30,203,179,196,224,214,229,231,272,234,246,10,-33,2,-41,-83,-53,-70,-31,-81,-71,-76,0,5,8,2,7,4,10,7,7,10,10,62,9,45,7,327,374,608,656,575,427,752,62,14,53,9,334,378,618,663,582,437,762,1,-1,-2,-4,6,2,3,2,3,-1,-6,320,320,319,310,307,302,299,317,308,305,303,303,8.2781456954,8.8067145116,7.5385438451,6.8209854147,7.6800152646,7.4290386637,9.0929756763,8.4648112037,7.0874187447,7.2275838612,9.8850798598,8.7094027491,9.5326102816,10.836175411,10.208219047,10.699684616,10.502386906,12.054600248,10.174576603,10.458738999,-1.606934164,0.0973117626,-1.994066436,-4.015189996,-2.528203783,-3.270645953,-1.40941123,-3.589789044,-3.087157858,-3.231155138,0.2434748734,0.3892470502,0.0972715335,0.3386304816,0.1908078327,0.4672351361,0.3182541487,0.3102286829,0.4348109659,0.4251519918,0.4382547721,2.1895146576,0.3404503672,15.818881068,17.840532354,28.407896274,29.824960218,25.483070378,18.566428245,31.971429786,0.6817296455,2.5787617078,0.4377219007,16.15751155,18.031340187,28.87513141,30.143214367,25.79329906,19.001239211,32.396581778 +050,3,7,48,021,Texas,Bastrop County,74171,74230,74381,75058,74745,75809,77726,80109,82642,84624,86590,88737,91601,151,677,-313,1064,1917,2383,2533,1982,1966,2147,2864,184,875,797,892,1036,1033,1109,1087,1092,1070,1095,176,564,580,623,657,646,680,697,728,722,803,8,311,217,269,379,387,429,390,364,348,292,-5,14,20,-31,11,0,26,-8,-26,-34,-21,146,354,-565,820,1493,1972,2071,1598,1626,1838,2609,141,368,-545,789,1504,1972,2097,1590,1600,1804,2588,2,-2,15,6,34,24,7,2,2,-5,-16,2337,2340,2238,2226,2201,2113,2233,2195,2248,2172,2285,2286,11.710463801,10.640641376,11.849568925,13.495294233,13.089618906,13.628180472,12.997261846,12.755966218,12.205764087,12.14386319,7.5482303816,7.7435031341,8.2761002697,8.5583091803,8.1857636139,8.3563234635,8.3340308252,8.5039774785,8.2360389444,8.9054996728,4.1622334197,2.8971382416,3.5734686558,4.9369850523,4.9038552919,5.2718570086,4.6632310212,4.2519887392,3.9697251422,3.2383635174,0.1873674208,0.2670173495,-0.411812373,0.1432898036,0,0.3195064854,-0.095656021,-0.303713481,-0.387846709,-0.232896006,4.7377190693,-7.543240122,10.893101479,19.448334256,24.988120506,25.449920431,19.107290184,18.993773874,20.966536814,28.934556222,4.9250864901,-7.276222773,10.481289106,19.59162406,24.988120506,25.769426916,19.011634164,18.690060392,20.578690105,28.701660216 +050,3,7,48,023,Texas,Baylor County,3726,3726,3708,3696,3593,3581,3569,3610,3636,3554,3565,3525,3518,-18,-12,-103,-12,-12,41,26,-82,11,-40,-7,8,37,40,43,36,40,38,38,34,39,38,28,55,70,72,40,63,59,68,72,40,45,-20,-18,-30,-29,-4,-23,-21,-30,-38,-1,-7,0,0,0,0,0,0,0,0,0,0,0,2,6,-75,18,-9,64,47,-52,50,-39,0,2,6,-75,18,-9,64,47,-52,50,-39,0,0,0,2,-1,1,0,0,0,-1,0,0,65,65,66,61,61,66,66,70,64,67,64,64,9.9945975149,10.975442448,11.987733482,10.06993007,11.143613317,10.488545404,10.570236439,9.5519033572,11.001410437,10.790856169,14.856834144,19.207024283,20.07248397,11.188811189,17.551190974,16.284846812,18.915159944,20.227560051,11.283497884,12.778645464,-4.862236629,-8.231581836,-8.084750488,-1.118881119,-6.407577657,-5.796301408,-8.344923505,-10.67565669,-0.282087447,-1.987789294,0,0,0,0,0,0,0,0,0,0,1.6207455429,-20.57895459,5.0181209925,-2.517482517,17.829781307,12.972674579,-14.46453408,14.046916702,-11.00141044,0,1.6207455429,-20.57895459,5.0181209925,-2.517482517,17.829781307,12.972674579,-14.46453408,14.046916702,-11.00141044,0 +050,3,7,48,025,Texas,Bee County,31861,31858,31862,32316,32486,32811,32847,32620,32823,32598,32494,32618,32513,4,454,170,325,36,-227,203,-225,-104,124,-105,88,338,383,386,385,414,400,344,336,305,307,94,242,238,204,281,265,255,255,305,242,210,-6,96,145,182,104,149,145,89,31,63,97,2,14,16,5,4,3,4,5,5,1,2,10,341,14,139,-66,-383,55,-321,-141,58,-205,12,355,30,144,-62,-380,59,-316,-136,59,-203,-2,3,-5,-1,-6,4,-1,2,1,2,1,7499,7521,7699,7623,7635,7669,7473,7650,7788,7749,7761,7753,10.533204525,11.82062282,11.822901512,11.727436108,12.647593444,12.224378467,10.516500818,10.323849321,9.3684727854,9.427154504,7.5415251332,7.3454523009,6.2483728196,8.5595053154,8.0956817939,7.7930412726,7.7956619434,9.3713513181,7.4333456199,6.4485421689,2.9916793917,4.4751705194,5.574528692,3.1679307929,4.5519116501,4.4313371942,2.7208388744,0.9524980028,1.9351271655,2.9786123351,0.436286578,0.4938119194,0.1531463926,0.121843492,0.0916492279,0.1222437847,0.1528561165,0.1536287101,0.0307163042,0.0614146873,10.626694506,0.4320854295,4.2574697153,-2.010417619,-11.70055142,1.6808520392,-9.813362682,-4.332329626,1.7815456444,-6.295005451,11.062981084,0.9258973488,4.4106161079,-1.888574127,-11.60890219,1.8030958238,-9.660506565,-4.178700916,1.8122619486,-6.233590763 +050,3,7,48,027,Texas,Bell County,310235,310178,312886,315915,325138,327254,330436,336434,341477,347683,355722,363693,369927,2708,3029,9223,2116,3182,5998,5043,6206,8039,7971,6234,1551,6657,5891,6522,6317,6378,6318,5857,6031,5921,5939,393,1882,1863,1927,2071,2200,2223,2141,2301,2326,2527,1158,4775,4028,4595,4246,4178,4095,3716,3730,3595,3412,451,490,2415,1488,1562,1912,1202,802,550,160,337,1009,-2241,2638,-4011,-2620,-55,-245,1683,3737,4201,2462,1460,-1751,5053,-2523,-1058,1857,957,2485,4287,4361,2799,90,5,142,44,-6,-37,-9,5,22,15,23,8079,8066,8224,10505,9227,9608,9856,9299,9432,9971,10412,10413,21.173630449,18.379135578,19.994113968,19.209658046,19.128165909,18.639614935,16.997504208,17.148015724,16.460596457,16.19094354,5.9859955693,5.8123119305,5.9074912016,6.2977998753,6.5979876138,6.5583830326,6.2133611933,6.5424613132,6.4663650327,6.8891251602,15.18763488,12.566823648,14.086622767,12.91185817,12.530178296,12.081231902,10.784143015,10.60555441,9.9942314241,9.3018183801,1.5585216945,7.5344784285,4.561674576,4.749958187,5.7342510534,3.5461882164,2.3274711243,1.5638216959,0.4448058492,0.9187317685,-7.12785126,8.2302087347,-12.29628812,-7.967279417,-0.16494969,-0.722808746,4.8842068605,10.625457596,11.678933578,6.7119217033,-5.569329565,15.764687163,-7.734613545,-3.21732123,5.5693013631,2.8233794702,7.2116779848,12.189279291,12.123739427,7.6306534718 +050,3,7,48,029,Texas,Bexar County,1714773,1714781,1722841,1755360,1788768,1821354,1857977,1894811,1927409,1956394,1981061,2002445,2026823,8060,32519,33408,32586,36623,36834,32598,28985,24667,21384,24378,6214,26202,25870,26433,27456,28139,28093,27351,26823,26522,26476,2790,11408,11412,12289,12272,12976,12887,13346,13764,14178,15038,3424,14794,14458,14144,15184,15163,15206,14005,13059,12344,11438,867,3845,6009,4734,5841,6128,5154,4152,2867,2176,2056,3580,13822,12743,13531,15418,15501,12240,10805,8717,6775,10790,4447,17667,18752,18265,21259,21629,17394,14957,11584,8951,12846,189,58,198,177,180,42,-2,23,24,89,94,42001,42102,42001,41936,41730,42950,42644,42287,42858,43061,42199,42211,15.066409331,14.598795529,14.643826441,14.924452299,14.996317405,14.699834128,14.084648475,13.624536661,13.315908147,13.141841148,6.5597129091,6.4399479928,6.8080801701,6.6707779213,6.9153919699,6.7432015949,6.8726451882,6.991317996,7.1183525266,7.4643831088,8.5066964215,8.158847536,7.8357462712,8.2536743772,8.0809254346,7.9566325329,7.2120032865,6.6332186654,6.1975556206,5.6774580395,2.2109130553,3.3909610488,2.6226260498,3.1750337222,3.2658386245,2.6968620331,2.1381105066,1.4562706113,1.0925049441,1.0205327618,7.9477868013,7.1910495332,7.4961455596,8.3808714139,8.2610581786,6.4046548864,5.5641339172,4.4277331423,3.4015261933,5.3558115271,10.158699857,10.582010582,10.118771609,11.555905136,11.526896803,9.1015169195,7.7022444238,5.8840037537,4.4940311374,6.3763442888 +050,3,7,48,031,Texas,Blanco County,10497,10485,10501,10569,10619,10639,10807,11030,11291,11473,11661,11971,12269,16,68,50,20,168,223,261,182,188,310,298,21,99,97,72,86,105,100,100,76,82,83,40,123,104,110,96,123,133,116,135,135,145,-19,-24,-7,-38,-10,-18,-33,-16,-59,-53,-62,8,21,16,12,19,15,5,2,2,1,5,26,72,41,47,155,224,287,195,245,364,358,34,93,57,59,174,239,292,197,247,365,363,1,-1,0,-1,4,2,2,1,0,-2,-3,106,106,100,104,100,99,99,95,23,52,53,53,9.397247271,9.1561261091,6.7739204064,8.0201436165,9.6167055914,8.9601720353,8.7858021437,6.5704158382,6.9397427217,6.8481848185,11.675367822,9.8168774778,10.349045065,8.9527184557,11.265283693,11.917028807,10.191530487,11.671133397,11.425186188,11.96369637,-2.278120551,-0.660751369,-3.575124659,-0.932574839,-1.648578101,-2.956856772,-1.405728343,-5.100717559,-4.485443466,-5.115511551,1.9933554817,1.5102888427,1.1289867344,1.7718921943,1.3738150845,0.4480086018,0.1757160429,0.17290568,0.0846310088,0.4125412541,6.8343616516,3.8701151595,4.4218647098,14.454910007,20.515638595,25.715693741,17.13231418,21.180945794,30.805687204,29.537953795,8.8277171334,5.3804040023,5.5508514442,16.226802201,21.88945368,26.163702343,17.308030223,21.353851474,30.890318213,29.95049505 +050,3,7,48,033,Texas,Borden County,641,641,646,632,613,646,665,655,658,669,650,656,706,5,-14,-19,33,19,-10,3,11,-19,6,50,1,6,3,8,8,5,10,8,3,4,4,0,6,6,4,3,7,6,4,3,5,7,1,0,-3,4,5,-2,4,4,0,-1,-3,0,0,0,0,0,0,0,0,0,0,0,4,-14,-15,28,13,-9,0,8,-20,6,54,4,-14,-15,28,13,-9,0,8,-20,6,54,0,0,-1,1,1,1,-1,-1,1,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,9.3896713615,4.8192771084,12.708498809,12.204424104,7.5757575758,15.23229246,12.057272042,4.5489006823,6.1255742726,5.8737151248,9.3896713615,9.6385542169,6.3542494043,4.5766590389,10.606060606,9.139375476,6.0286360211,4.5489006823,7.6569678407,10.279001468,0,-4.819277108,6.3542494043,7.6277650648,-3.03030303,6.092916984,6.0286360211,0,-1.531393568,-4.405286344,0,0,0,0,0,0,0,0,0,0,-21.90923318,-24.09638554,44.47974583,19.832189169,-13.63636364,0,12.057272042,-30.32600455,9.1883614089,79.295154185,-21.90923318,-24.09638554,44.47974583,19.832189169,-13.63636364,0,12.057272042,-30.32600455,9.1883614089,79.295154185 +050,3,7,48,035,Texas,Bosque County,18212,18214,18269,18260,18127,17864,17715,17860,18035,18309,18598,18594,18603,55,-9,-133,-263,-149,145,175,274,289,-4,9,51,177,183,200,177,174,214,175,188,153,159,50,255,246,239,263,229,249,260,273,242,267,1,-78,-63,-39,-86,-55,-35,-85,-85,-89,-108,-1,-2,3,2,4,4,15,11,8,10,8,56,73,-75,-231,-64,196,195,348,365,76,109,55,71,-72,-229,-60,200,210,359,373,86,117,-1,-2,2,5,-3,0,0,0,1,-1,0,329,329,332,322,325,314,330,326,330,319,297,298,9.6909304936,10.05853739,11.113889584,9.9496894235,9.7821503865,11.923666249,9.6302003082,10.187769258,8.2275758228,8.5490765384,13.961510033,13.521312557,13.281098052,14.784001799,12.874209417,13.873798579,14.307726172,14.793941529,13.013551301,14.355996451,-4.27057954,-3.462775167,-2.167208469,-4.834312375,-3.09205903,-1.95013233,-4.677525864,-4.606172271,-4.785975479,-5.806919913,-0.109502039,0.1648940556,0.1111388958,0.2248517384,0.2248770204,0.8357709987,0.6053268765,0.4335220961,0.5377500538,0.4301422158,3.9968244409,-4.122351389,-12.83654247,-3.597627814,11.018973999,10.865022984,19.150341184,19.779445634,4.0869004087,5.8606876899,3.8873224014,-3.957457334,-12.72540357,-3.372776076,11.243851019,11.700793982,19.755668061,20.21296773,4.6246504625,6.2908299056 +050,3,7,48,037,Texas,Bowie County,92565,92564,92645,92832,93068,93425,93337,93146,93575,93625,93922,93505,93481,81,187,236,357,-88,-191,429,50,297,-417,-24,302,1213,1223,1196,1215,1222,1271,1207,1119,1133,1098,273,972,918,1007,977,1034,1002,1011,1084,1041,1068,29,241,305,189,238,188,269,196,35,92,30,11,47,65,58,114,77,90,70,50,52,39,46,-98,-121,122,-436,-452,76,-214,217,-561,-98,57,-51,-56,180,-322,-375,166,-144,267,-509,-59,-5,-3,-13,-12,-4,-4,-6,-2,-5,0,5,6206,6222,6286,6240,6093,6117,5902,5842,5834,5912,5827,5825,13.079788869,13.157611619,12.826218678,13.011212131,13.105752267,13.613894527,12.895299145,11.933008792,12.090040389,11.744194753,10.481083908,9.8762775686,10.799332951,10.462513788,11.089482687,10.732590335,10.801282051,11.559769018,11.108324841,11.423315115,2.5987049607,3.2813340506,2.0268857276,2.5486983433,2.0162695795,2.8813041918,2.094017094,0.3732397746,0.9817155479,0.320879638,0.5068013824,0.6993006993,0.6220072603,1.2208050888,0.8258125406,0.9640051199,0.7478632479,0.5331996779,0.554882701,0.4171435295,-1.056734797,-1.301775148,1.3083600993,-4.669044024,-4.847626861,0.8140487679,-2.286324786,2.3140866023,-5.986330678,-1.048206818,-0.549933415,-0.602474449,1.9303673596,-3.448238935,-4.021814321,1.7780538879,-1.538461538,2.8472862802,-5.431447977,-0.631063288 +050,3,7,48,039,Texas,Brazoria County,313166,313186,314499,319214,324295,329961,337632,345295,353361,362261,369470,374699,380518,1313,4715,5081,5666,7671,7663,8066,8900,7209,5229,5819,1205,4700,4505,4550,4762,4885,4873,4684,4694,4756,4721,505,1969,1956,2133,2247,2149,2306,2328,2437,2546,2816,700,2731,2549,2417,2515,2736,2567,2356,2257,2210,1905,82,302,435,417,648,501,608,607,480,253,271,514,1682,2101,2800,4423,4394,4878,5920,4469,2761,3647,596,1984,2536,3217,5071,4895,5486,6527,4949,3014,3918,17,0,-4,32,85,32,13,17,3,5,-4,10559,10585,10668,10556,10274,10575,10285,9954,10453,10478,10313,10301,14.833213142,14.001358178,13.908928615,14.266177147,14.306067852,13.949640453,13.0907099,12.829851407,12.782042789,12.502366869,6.2141695058,6.0791690559,6.5203834585,6.7316463774,6.2934984266,6.6012458205,6.5062281484,6.6609177416,6.8425317367,7.4574592468,8.6190436365,7.9221891225,7.3885451566,7.5345307695,8.0125694254,7.348394632,6.5844817515,6.1689336655,5.9395110519,5.0449076226,0.9531128445,1.3519624434,1.2747303808,1.9413025601,1.4672139189,1.7404845876,1.6964263256,1.3119575363,0.6799530752,0.7176745227,5.3083967032,6.5298232037,8.5593406862,13.250588308,12.86813964,13.963953648,16.545047525,12.214871312,7.4203574726,9.6581512334,6.2615095477,7.8817856471,9.834071067,15.191890868,14.335353559,15.704438236,18.241473851,13.526828848,8.1003105477,10.375825756 +050,3,7,48,041,Texas,Brazos County,194851,194861,195671,197481,200304,204164,209039,216339,219881,223985,226011,229418,232555,810,1810,2823,3860,4875,7300,3542,4104,2026,3407,3137,670,2612,2586,2627,2703,2893,2888,2670,2714,2534,2587,227,824,872,930,935,1077,990,976,1085,1154,1262,443,1788,1714,1697,1768,1816,1898,1694,1629,1380,1325,302,1133,1325,1301,1727,1646,1467,1385,998,1022,810,80,-1124,-191,866,1363,3771,179,1016,-611,997,977,382,9,1134,2167,3090,5417,1646,2401,387,2019,1787,-15,13,-25,-4,17,67,-2,9,10,8,25,13512,13511,13086,12843,13837,14036,15103,14011,15186,14545,14466,14468,13.287481686,13.001998567,12.989902786,13.083157673,13.602019851,13.241025171,12.030657901,12.062329443,11.127969453,11.199788732,4.1917629823,4.3842779391,4.5986332664,4.5256205787,5.0637315517,4.5389940856,4.3977236373,4.8222650868,5.0677493089,5.46352276,9.0957187042,8.617720628,8.3912695195,8.5575370944,8.5382882989,8.7020310852,7.6329342639,7.2400643561,6.0602201441,5.7362659723,5.7636741006,6.6618902171,6.433141806,8.3590874219,7.738999196,6.7259639631,6.2406221698,4.4355949831,4.4880760777,3.5066984434,-5.717890282,-0.96031776,4.2821681814,6.5972415496,17.730112982,0.8206868094,4.5779582126,-2.715579694,4.3782894809,4.2296844188,0.045783819,5.7015724575,10.715309987,14.956328971,25.469112178,7.5466507725,10.818580382,1.720015289,8.8663655586,7.7363828622 +050,3,7,48,043,Texas,Brewster County,9232,9232,9258,9350,9262,9288,9148,9140,9213,9324,9236,9144,9237,26,92,-88,26,-140,-8,73,111,-88,-92,93,25,136,103,124,102,101,102,81,109,82,88,45,86,66,61,66,68,84,100,73,73,79,-20,50,37,63,36,33,18,-19,36,9,9,2,2,-2,-1,0,10,7,7,6,1,3,40,40,-125,-36,-179,-51,48,123,-128,-102,82,42,42,-127,-37,-179,-41,55,130,-122,-101,85,4,0,2,0,3,0,0,0,-2,0,-1,75,75,73,44,44,44,44,44,44,44,44,44,14.617368874,11.068128089,13.369272237,11.065307008,11.045494313,11.115348989,8.7392782004,11.745689655,8.922742111,9.5751047277,9.2433361995,7.0921985816,6.576819407,7.1599045346,7.4365704287,9.1538168147,10.789232346,7.8663793103,7.9434167573,8.5958326533,5.3740326741,3.9759295078,6.7924528302,3.9054024734,3.6089238845,1.9615321746,-2.049954146,3.8793103448,0.9793253536,0.9792720744,0.214961307,-0.214915109,-0.107816712,0,1.0936132983,0.7628180679,0.7552462642,0.6465517241,0.1088139282,0.3264240248,4.2992261393,-13.43219428,-3.881401617,-19.41852897,-5.577427822,5.2307524655,13.270755786,-13.79310345,-11.09902067,8.9222566781,4.5141874463,-13.64710939,-3.989218329,-19.41852897,-4.483814523,5.9935705334,14.02600205,-13.14655172,-10.99020675,9.2486807029 +050,3,7,48,045,Texas,Briscoe County,1637,1637,1633,1658,1576,1563,1553,1515,1481,1515,1511,1542,1487,-4,25,-82,-13,-10,-38,-34,34,-4,31,-55,7,18,13,11,11,13,9,13,17,18,20,9,21,13,15,24,19,24,17,17,16,12,-2,-3,0,-4,-13,-6,-15,-4,0,2,8,0,1,1,2,2,1,1,1,1,1,1,-2,26,-87,-9,1,-32,-20,37,-5,28,-64,-2,27,-86,-7,3,-31,-19,38,-4,29,-63,0,1,4,-2,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,10.938924339,8.0395794682,7.0086014654,7.0603337612,8.4745762712,6.0080106809,8.6782376502,11.235955056,11.791680314,13.205678442,12.762078396,8.0395794682,9.5571838165,15.40436457,12.385919166,16.021361816,11.348464619,11.235955056,10.481493613,7.923407065,-1.823154057,0,-2.548582351,-8.344030809,-3.911342894,-10.01335113,-2.670226969,0,1.3101867016,5.2822713767,0.6077180188,0.6184291899,1.2742911755,1.2836970475,0.6518904824,0.6675567423,0.6675567423,0.6609385327,0.6550933508,0.6602839221,15.80066849,-53.80333952,-5.73431029,0.6418485237,-20.86049544,-13.35113485,24.699599466,-3.304692664,18.342613822,-42.25817101,16.408386509,-53.18491033,-4.460019114,1.9255455712,-20.20860495,-12.6835781,25.367156208,-2.643754131,18.997707173,-41.59788709 +050,3,7,48,047,Texas,Brooks County,7223,7227,7213,7223,7203,7266,7237,7203,7220,7138,7084,7093,6964,-14,10,-20,63,-29,-34,17,-82,-54,9,-129,26,137,132,111,131,115,134,95,105,107,108,12,76,82,86,96,90,82,82,70,67,75,14,61,50,25,35,25,52,13,35,40,33,5,25,39,55,36,51,49,42,32,39,29,-34,-77,-111,-15,-101,-110,-84,-140,-121,-70,-190,-29,-52,-72,40,-65,-59,-35,-98,-89,-31,-161,1,1,2,-2,1,0,0,3,0,0,-1,67,67,67,68,63,61,59,60,52,56,55,54,18.98032696,18.300291141,15.343147419,18.065227884,15.927977839,18.581432434,13.233040813,14.765855716,15.094871976,15.366009817,10.529232474,11.368362678,11.887483586,13.238640281,12.465373961,11.370727311,11.42220365,9.843903811,9.4519291811,10.670840151,8.451094486,6.9319284625,3.455663833,4.8265876026,3.4626038781,7.2107051238,1.810837164,4.9219519055,5.6429427947,4.6951696664,3.4635633139,5.4069042007,7.6024604326,4.9644901055,7.0637119114,6.7947029051,5.8503969912,4.5000703136,5.5018692248,4.1260581916,-10.66777501,-15.38888119,-2.0733983,-13.9281528,-15.23545706,-11.64806212,-19.5013233,-17.01589087,-9.875149891,-27.03279505,-7.204211693,-9.981976986,5.5290621328,-8.96366269,-8.171745152,-4.853359218,-13.65092631,-12.51582056,-4.373280666,-22.90673686 +050,3,7,48,049,Texas,Brown County,38106,38106,38076,37995,37804,37663,37544,37729,38056,37816,37750,37770,37633,-30,-81,-191,-141,-119,185,327,-240,-66,20,-137,108,429,417,410,448,389,432,399,363,415,383,160,473,459,502,494,482,491,511,511,433,475,-52,-44,-42,-92,-46,-93,-59,-112,-148,-18,-92,3,18,19,29,39,27,31,23,18,24,17,25,-53,-167,-72,-111,253,358,-148,65,16,-61,28,-35,-148,-43,-72,280,389,-125,83,40,-44,-6,-2,-1,-6,-1,-2,-3,-3,-1,-2,-1,1668,1668,1636,1632,1677,1765,1772,1809,1669,1664,1579,1579,11.278936783,11.002783678,10.865676388,11.913784621,10.335711344,11.400672956,10.517714045,9.6074954345,10.990466102,10.158746999,12.435750812,12.110977717,13.303828163,13.137075006,12.806716884,12.957709309,13.470054829,13.524601011,11.467161017,12.598968211,-1.156814029,-1.108194039,-2.438151775,-1.223290385,-2.47100554,-1.557036353,-2.952340784,-3.917105577,-0.476694915,-2.440221211,0.4732421028,0.501325875,0.7685478421,1.0371375005,0.7173887051,0.8181038464,0.6062842682,0.4764047323,0.6355932203,0.4509104412,-1.39343508,-4.406390586,-1.90811878,-2.951852886,6.7221978664,9.4477799037,-3.901307465,1.7203504221,0.4237288136,-1.61797276,-0.920192978,-3.905064711,-1.139570938,-1.914715386,7.4395865715,10.26588375,-3.295023197,2.1967551544,1.0593220339,-1.167062318 +050,3,7,48,051,Texas,Burleson County,17187,17187,17238,17330,17437,17272,17388,17612,17862,18055,18329,18425,18514,51,92,107,-165,116,224,250,193,274,96,89,52,185,191,200,191,207,226,223,187,198,193,24,192,189,212,208,209,238,235,242,214,235,28,-7,2,-12,-17,-2,-12,-12,-55,-16,-42,7,33,30,16,32,40,40,34,29,27,24,17,67,78,-170,102,186,222,171,299,85,107,24,100,108,-154,134,226,262,205,328,112,131,-1,-1,-3,1,-1,0,0,0,1,0,0,163,163,169,172,164,175,172,173,175,167,160,160,10.703540847,10.987430609,11.524388487,11.02135026,11.828571429,12.741726335,12.417518167,10.279243624,10.774337487,10.449660251,11.10853969,10.87237898,12.215851796,12.002308136,11.942857143,13.418278176,13.085725423,13.302550572,11.644991021,12.72367958,-0.404998843,0.1150516294,-0.691463309,-0.980957877,-0.114285714,-0.676551841,-0.668207256,-3.023306948,-0.870653534,-2.274019329,1.9092802592,1.7257744413,0.921951079,1.846508944,2.2857142857,2.2551728026,1.8932538909,1.5941072999,1.4692278391,1.2994396167,3.876417496,4.4870135473,-9.795730214,5.8857472591,10.628571429,12.516209055,9.5219533925,16.435795954,4.625346901,5.7933349576,5.7856977551,6.2127879886,-8.873779135,7.7322562031,12.914285714,14.771381857,11.415207283,18.029903254,6.0945747402,7.0927745743 +050,3,7,48,053,Texas,Burnet County,42750,42710,42760,43221,43383,43580,43957,44738,45836,46592,47377,48280,49653,50,461,162,197,377,781,1098,756,785,903,1373,108,465,460,457,468,484,550,489,451,485,477,117,437,411,445,451,539,472,514,530,489,517,-9,28,49,12,17,-55,78,-25,-79,-4,-40,14,34,28,-3,-1,-9,-20,-27,-31,-32,-21,47,399,86,190,362,837,1034,804,893,942,1445,61,433,114,187,361,828,1014,777,862,910,1424,-2,0,-1,-2,-1,8,6,4,2,-3,-11,1059,1059,1129,1188,1207,1190,1163,1194,1168,1117,1142,1140,10.816343146,10.623065909,10.510216989,10.692621406,10.913805739,12.144765606,10.581209157,9.5989102789,10.140397462,9.7413537827,10.165036462,9.4914784537,10.234237549,10.304214218,12.154010936,10.422417029,11.122170771,11.280315849,10.224029606,10.558238796,0.651306684,1.1315874555,0.2759794395,0.3884071878,-1.240205198,1.7223485769,-0.540961613,-1.68140557,-0.083632144,-0.816885013,0.790872402,0.6466214032,-0.06899486,-0.022847482,-0.202942669,-0.44162784,-0.584238542,-0.659792059,-0.669057152,-0.428864632,9.2811202475,1.9860514526,4.3696744593,8.2707883524,18.873668189,22.832159339,17.397325486,19.006268025,19.695369915,29.509971103,10.07199265,2.6326728558,4.3006795994,8.2479408707,18.67072552,22.390531499,16.813086943,18.346475965,19.026312763,29.081106471 +050,3,7,48,055,Texas,Caldwell County,38066,38014,38087,38432,38648,39167,39670,40386,41095,42302,43129,43579,43979,73,345,216,519,503,716,709,1207,827,450,400,115,483,453,478,485,529,530,551,588,556,565,38,283,300,286,345,333,343,355,371,358,385,77,200,153,192,140,196,187,196,217,198,180,3,10,5,-3,28,37,46,39,28,20,23,-6,135,63,331,340,482,477,968,585,231,195,-3,145,68,328,368,519,523,1007,613,251,218,-1,0,-5,-1,-5,1,-1,4,-3,1,2,3376,3371,3368,3361,3360,3352,3354,3347,3347,3358,3360,3361,12.624315529,11.754021796,12.285549059,12.303867473,13.215748976,13.009167781,13.213904577,13.765494961,12.824652858,12.905731058,7.3968556829,7.7841203944,7.3507678468,8.7522356254,8.3191765764,8.4191406586,8.5134956893,8.6853718205,8.2576002214,8.7941707211,5.2274598466,3.9699014011,4.9347812118,3.551631848,4.8965723993,4.5900271229,4.7004088876,5.0801231403,4.5670526364,4.1115603371,0.2613729923,0.1297353399,-0.077105956,0.7103263696,0.9243529529,1.129097581,0.9352854419,0.65549976,0.4613184481,0.5253660431,3.5285353964,1.6346652828,8.5073571933,8.6253916308,12.0415709,11.708251003,23.214264302,13.695262844,5.3282280758,4.4541903652,3.7899083888,1.7644006227,8.4302512369,9.3357180004,12.965923853,12.837348584,24.149549744,14.350762604,5.789546524,4.9795564083 +050,3,7,48,057,Texas,Calhoun County,21381,21380,21312,21353,21564,21719,21799,21873,21939,21716,21455,21237,21001,-68,41,211,155,80,74,66,-223,-261,-218,-236,73,285,251,285,322,318,305,270,269,279,268,73,203,186,206,200,207,194,209,226,193,237,0,82,65,79,122,111,111,61,43,86,31,7,17,34,29,39,40,45,44,41,7,16,-77,-58,111,50,-78,-73,-91,-329,-345,-310,-282,-70,-41,145,79,-39,-33,-46,-285,-304,-303,-266,2,0,1,-3,-3,-4,1,1,0,-1,-1,249,249,245,242,239,247,241,249,249,251,249,249,13.359896871,11.696996528,13.16914262,14.798474195,14.563106796,13.923126084,12.3697171,12.462069445,13.070364471,12.689994791,9.5159967186,8.6678938416,9.5187487004,9.1915988786,9.4797581975,8.8560211814,9.5750773107,10.469991429,9.0415066055,11.22212226,3.8439001523,3.0291026866,3.6503939191,5.606875316,5.0833485986,5.0671049028,2.7946397893,1.9920780153,4.0288578656,1.4678725318,0.7969061291,1.584453713,1.3400180209,1.7923617813,1.8318373328,2.0542317173,2.0158057496,1.8994232239,0.3279302914,0.7576116293,-2.718856205,5.1727753571,2.3103758982,-3.584723563,-3.343103132,-4.154113028,-15.07272936,-15.98295152,-14.52262719,-13.35290497,-1.921950076,6.7572290701,3.6503939191,-1.792361781,-1.5112658,-2.099881311,-13.05692361,-14.08352829,-14.1946969,-12.59529334 +050,3,7,48,059,Texas,Callahan County,13544,13545,13511,13513,13488,13502,13508,13595,13789,13967,13986,13941,14110,-34,2,-25,14,6,87,194,178,19,-45,169,31,120,122,136,141,155,150,163,135,133,121,61,158,142,176,178,168,191,172,170,182,198,-30,-38,-20,-40,-37,-13,-41,-9,-35,-49,-77,0,6,5,5,8,9,4,4,3,2,2,-3,35,-8,51,36,92,231,183,51,2,245,-3,41,-3,56,44,101,235,187,54,4,247,-1,-1,-2,-2,-1,-1,0,0,0,0,-1,75,75,71,79,75,75,77,75,73,72,77,77,8.8809946714,9.0367023444,10.077806595,10.440577564,11.437848209,10.955302366,11.745208243,9.6590705828,9.5248325993,8.6271434173,11.693309651,10.518128958,13.041867358,13.180303591,12.397151607,13.94975168,12.393716674,12.163274067,13.033981452,14.117143774,-2.812314979,-1.481426614,-2.964060763,-2.739726027,-0.959303398,-2.994449313,-0.648508431,-2.504203484,-3.509148852,-5.490000356,0.4440497336,0.3703566535,0.3705075954,0.5923731951,0.6641331218,0.2921413964,0.2882259692,0.214646013,0.1432305654,0.1425974119,2.5902901125,-0.592570646,3.7791774731,2.665679378,6.7889163561,16.871165644,13.186338089,3.6489822202,0.1432305654,17.468182952,3.0343398461,-0.222213992,4.1496850685,3.2580525731,7.4530494779,17.163307041,13.474564058,3.8636282331,0.2864611308,17.610780364 +050,3,7,48,061,Texas,Cameron County,406220,406214,407608,413116,415729,417129,418698,419062,420894,421506,421446,422649,424180,1394,5508,2613,1400,1569,364,1832,612,-60,1203,1531,1817,7816,7359,7365,7361,7248,7167,6545,6261,6258,6223,598,2327,2369,2461,2605,2660,2666,2653,2728,2809,3006,1219,5489,4990,4904,4756,4588,4501,3892,3533,3449,3217,75,681,558,317,557,595,582,70,-111,-59,12,136,-643,-2970,-3872,-3788,-4852,-3252,-3360,-3492,-2198,-1712,211,38,-2412,-3555,-3231,-4257,-2670,-3290,-3603,-2257,-1700,-36,-19,35,51,44,33,1,10,10,11,14,3730,3731,3851,3885,3851,3819,3337,3326,3365,3317,3430,3427,19.046597882,17.757240497,17.686088145,17.613692786,17.30328495,17.065179605,15.538936372,14.854938359,14.82771489,14.697182076,5.6706030285,5.7163884683,5.9097709333,6.2333473314,6.3502673797,6.3479515594,6.2986704653,6.4724919094,6.6556489495,7.0994262124,13.375994853,12.040852029,11.776317211,11.380345454,10.953017571,10.717228045,9.2402659069,8.3824464501,8.1720659404,7.5977558633,1.6595103835,1.3464519904,0.761234208,1.3328116943,1.4204545455,1.3857868746,0.1661918329,-0.263360191,-0.139794691,0.0283410228,-1.566909217,-7.166599304,-9.298103638,-9.064076657,-11.58326967,-7.743262742,-7.977207977,-8.285169262,-5.207944603,-4.043319253,0.0926011668,-5.820147313,-8.53686943,-7.731264963,-10.16281513,-6.357475868,-7.811016144,-8.548529454,-5.347739295,-4.014978231 +050,3,7,48,063,Texas,Camp County,12401,12399,12396,12421,12487,12462,12654,12691,12751,12829,12974,13078,13060,-3,25,66,-25,192,37,60,78,145,104,-18,56,173,157,205,210,200,165,181,176,181,183,57,135,155,146,139,145,160,126,139,138,138,-1,38,2,59,71,55,5,55,37,43,45,9,36,64,26,48,42,42,28,23,29,22,-11,-50,2,-110,71,-59,14,-3,86,32,-86,-2,-14,66,-84,119,-17,56,25,109,61,-64,0,1,-2,0,2,-1,-1,-2,-1,0,1,67,67,68,68,70,67,66,60,65,67,67,67,13.942055849,12.606391521,16.43352439,16.722408027,15.782205563,12.970678406,14.151681001,13.641824594,13.89528635,14.002601576,10.879638957,12.445800546,11.703875907,11.068641503,11.442099033,12.577627545,9.8514464425,10.773941015,10.594196223,10.559338894,3.0624168916,0.1605909748,4.7296484829,5.6537665233,4.3401065299,0.3930508608,4.3002345582,2.8678835794,3.3010901274,3.4432626827,2.9012370552,5.1389111932,2.0842518738,3.8222646918,3.3142631683,3.3016272306,2.1892103206,1.7827384413,2.2263165976,1.6833728671,-4.02949591,0.1605909748,-8.817988697,5.6537665233,-4.655750641,1.1005424102,-0.234558249,6.665891563,2.4566252111,-6.580457571,-1.128258855,5.299502168,-6.733736823,9.4760312152,-1.341487473,4.4021696408,1.9546520719,8.4486300043,4.6829418087,-4.897084704 +050,3,7,48,065,Texas,Carson County,6182,6186,6164,6240,6090,5988,6035,6014,6093,6003,5966,5867,5854,-22,76,-150,-102,47,-21,79,-90,-37,-99,-13,15,64,57,58,70,56,54,59,46,38,43,18,67,79,73,58,59,62,66,73,49,73,-3,-3,-22,-15,12,-3,-8,-7,-27,-11,-30,0,1,4,1,2,6,2,2,1,0,2,-20,77,-133,-92,34,-23,86,-86,-10,-88,15,-20,78,-129,-91,36,-17,88,-84,-9,-88,17,1,1,1,4,-1,-1,-1,1,-1,0,0,71,71,70,25,25,25,25,25,25,25,25,25,10.319251854,9.2457420925,9.6042391124,11.644348332,9.2953772097,8.9204592385,9.7552910053,7.6865235191,6.4227161328,7.3372579131,10.802966785,12.814274128,12.088094055,9.6481743325,9.793343846,10.242008755,10.912698413,12.198178628,8.2819234345,12.456275062,-0.483714931,-3.568532036,-2.483854943,1.9961739998,-0.497966636,-1.321549517,-1.157407407,-4.511655109,-1.859207302,-5.119017149,0.1612383102,0.6488240065,0.1655903295,0.3326956666,0.9959332725,0.3303873792,0.3306878307,0.1670983374,0,0.3412678099,12.415349887,-21.57339822,-15.23431032,5.6558263329,-3.817744211,14.206657306,-14.21957672,-1.670983374,-14.87365841,2.5595085744,12.576588197,-20.92457421,-15.06871999,5.9885219995,-2.821810939,14.537044685,-13.88888889,-1.503885036,-14.87365841,2.9007763843 +050,3,7,48,067,Texas,Cass County,30464,30469,30457,30279,30032,30235,30119,30137,30048,29958,30125,30002,29879,-12,-178,-247,203,-116,18,-89,-90,167,-123,-123,89,335,348,365,367,362,353,329,308,298,308,132,383,388,407,411,371,429,421,404,418,489,-43,-48,-40,-42,-44,-9,-76,-92,-96,-120,-181,-1,-2,17,12,14,10,4,5,4,4,2,34,-127,-225,231,-84,20,-14,-1,262,-7,56,33,-129,-208,243,-70,30,-10,4,266,-3,58,-2,-1,1,2,-2,-3,-3,-2,-3,0,0,354,354,354,360,356,371,364,354,354,355,358,358,11.031348788,11.540183383,12.112764863,12.161580011,12.015400956,11.730497632,10.96557011,10.252484064,9.9123521879,10.287069354,12.611959958,12.866641243,13.506562464,13.6196441,12.314126394,14.256043865,14.03193014,13.448063512,13.903903404,16.332392579,-1.58061117,-1.32645786,-1.393797601,-1.458064089,-0.298725438,-2.525546232,-3.066360031,-3.195579448,-3.991551217,-6.045323224,-0.065858799,0.5637445905,0.3982278859,0.4639294827,0.3319171535,0.1329234859,0.1666500017,0.1331491437,0.1330517072,0.0667991517,-4.18203372,-7.461325463,7.6658868037,-2.783576896,0.663834307,-0.465232201,-0.03333,8.7212689113,-0.232840488,1.8703762462,-4.247892518,-6.897580872,8.0641146896,-2.319647414,0.9957514604,-0.332308715,0.1333200013,8.854418055,-0.09978878,1.9371753979 +050,3,7,48,069,Texas,Castro County,8062,8063,8125,8089,8254,8108,7912,7774,7730,7668,7529,7484,7396,62,-36,165,-146,-196,-138,-44,-62,-139,-45,-88,30,139,140,114,129,124,102,103,100,116,104,0,59,49,76,60,74,60,58,63,49,56,30,80,91,38,69,50,42,45,37,67,48,5,51,47,48,40,36,31,25,15,15,23,25,-166,26,-237,-314,-225,-118,-133,-191,-127,-157,30,-115,73,-189,-274,-189,-87,-108,-176,-112,-134,2,-1,1,5,9,1,1,1,0,0,-2,64,64,64,63,56,63,64,63,70,64,46,45,17.145676576,17.132717371,13.934726806,16.104868914,15.81027668,13.157894737,13.378360826,13.160492202,15.453273829,13.978494624,7.2776612804,5.99645108,9.2898178707,7.4906367041,9.4351651154,7.7399380805,7.5334459021,8.2911100875,6.5276760141,7.5268817204,9.8680152954,11.136266291,4.6449089353,8.6142322097,6.3751115645,5.4179566563,5.844914924,4.8693821149,8.9255978152,6.4516129032,6.2908597508,5.7516979747,5.867253392,4.9937578027,4.5900803264,3.9989680083,3.2471749578,1.9740738304,1.9982681676,3.0913978495,-20.47613174,3.181790369,-28.96956362,-39.20099875,-28.68800204,-15.22187822,-17.27497078,-25.13654011,-16.91867049,-21.10215054,-14.18527199,8.9334883436,-23.10231023,-34.20724095,-24.09792171,-11.22291022,-14.02779582,-23.16246628,-14.92040232,-18.01075269 +050,3,7,48,071,Texas,Chambers County,35096,35103,35452,35693,36497,37359,38287,39025,40160,41249,42128,43726,45590,349,241,804,862,928,738,1135,1089,879,1598,1864,121,476,453,480,447,495,535,559,539,600,604,82,238,269,261,257,296,277,272,282,298,320,39,238,184,219,190,199,258,287,257,302,284,3,12,21,73,94,77,62,46,26,30,24,284,-9,590,563,635,462,814,756,599,1270,1570,287,3,611,636,729,539,876,802,625,1300,1594,23,0,9,7,9,0,1,0,-3,-4,-14,229,229,232,227,229,224,221,228,228,222,224,224,13.381123059,12.550214711,12.998266898,11.818205854,12.805256623,13.512660226,13.73312533,12.929225086,13.977217136,13.525012316,6.6905615293,7.4525557556,7.0678076256,6.7948073923,7.6572847682,6.9962745469,6.6823078529,6.7644554254,6.9420178442,7.1655694388,6.6905615293,5.0976589555,5.9304592721,5.0233984613,5.1479718543,6.5163856791,7.0508174772,6.1647696607,7.0351992918,6.359442877,0.3373392368,0.581798033,1.9768197574,2.4852602914,1.9919288079,1.5659531477,1.130096181,0.6236731952,0.6988608568,0.5374177079,-0.253004428,16.34575426,15.245883882,16.788726436,11.951572848,20.559449391,18.572885062,14.368470921,29.585109605,35.156075059,0.0843348092,16.927552293,17.22270364,19.273986728,13.943501656,22.125402538,19.702981243,14.992144116,30.283970461,35.693492767 +050,3,7,48,073,Texas,Cherokee County,50845,50827,50932,51082,51271,51089,51187,51567,51870,52099,52299,52561,52875,105,150,189,-182,98,380,303,229,200,262,314,202,769,710,729,786,777,764,753,712,717,699,78,532,478,547,503,529,565,571,585,540,578,124,237,232,182,283,248,199,182,127,177,121,1,9,7,5,30,43,47,2,-14,4,6,-14,-92,-41,-367,-208,95,61,48,88,80,185,-13,-83,-34,-362,-178,138,108,50,74,84,191,-6,-4,-9,-2,-7,-6,-4,-3,-1,1,2,2851,2851,2857,2880,2909,2952,2839,2861,2856,2768,2785,2779,15.076362068,13.873555245,14.243845252,15.370174821,15.123498842,14.772276845,14.485086901,13.640108048,13.675376693,13.259228347,10.429940988,9.3402245171,10.68776866,9.8361296883,10.296436148,10.924524106,10.984043321,11.207111247,10.299446882,10.963997117,4.6464210795,4.533330728,3.5560765924,5.5340451328,4.8270626934,3.8477527384,3.5010435803,2.4329968007,3.3759298112,2.2952312303,0.1764463701,0.1367815306,0.0976944119,0.5866478939,0.8369503864,0.9087657221,0.0384730064,-0.268204372,0.0762921991,0.1138131189,-1.803674006,-0.801148965,-7.170769832,-4.067425398,1.849076435,1.1794618947,0.923352153,1.6858560509,1.5258439825,3.5092378315,-1.627227635,-0.664367434,-7.07307542,-3.480777504,2.6860268213,2.0882276168,0.9618251594,1.4176516792,1.6021361816,3.6230509503 +050,3,7,48,075,Texas,Childress County,7041,7041,7069,7028,7102,7061,7201,7177,7204,7260,7265,7222,7143,28,-41,74,-41,140,-24,27,56,5,-43,-79,16,100,70,70,74,68,73,82,62,62,53,5,63,73,78,72,79,79,88,64,58,78,11,37,-3,-8,2,-11,-6,-6,-2,4,-25,0,0,1,3,3,6,3,-4,-6,-4,-4,15,-78,74,-37,130,-19,30,66,14,-43,-50,15,-78,75,-34,133,-13,33,62,8,-47,-54,2,0,2,1,5,0,0,0,-1,0,0,1418,1424,1425,1480,1465,1590,1551,1583,1695,1733,1729,1729,14.187415762,9.9079971691,9.8849113888,10.377226195,9.4588955348,10.152284264,11.338495575,8.5370051635,8.559398081,7.3790462931,8.9380719302,10.332625619,11.014615548,10.096760623,10.989010989,10.986718587,12.168141593,8.8123924269,8.00717885,10.859728507,5.249343832,-0.42462845,-1.129704159,0.2804655729,-1.530115454,-0.834434323,-0.829646018,-0.275387263,0.552219231,-3.480682214,0,0.1415428167,0.4236390595,0.4206983593,0.8346084295,0.4172171615,-0.553097345,-0.82616179,-0.552219231,-0.556909154,-11.06618429,10.474168436,-5.224881734,18.230262235,-2.642926694,4.1721716153,9.1261061947,1.9277108434,-5.936356734,-6.961364427,-11.06618429,10.615711253,-4.801242675,18.650960595,-1.808318264,4.5893887769,8.5730088496,1.1015490534,-6.488575965,-7.518273582 +050,3,7,48,077,Texas,Clay County,10752,10754,10737,10668,10525,10458,10380,10363,10268,10496,10439,10465,10550,-17,-69,-143,-67,-78,-17,-95,228,-57,26,85,19,92,75,112,74,88,99,81,83,73,77,22,102,118,114,125,128,117,132,124,125,147,-3,-10,-43,-2,-51,-40,-18,-51,-41,-52,-70,0,3,8,5,9,12,14,13,10,12,10,-16,-62,-110,-70,-37,13,-91,265,-27,68,145,-16,-59,-102,-65,-28,25,-77,278,-17,80,155,2,0,2,0,1,-2,0,1,1,-2,0,70,70,75,73,72,68,61,64,70,70,68,68,8.5961224013,7.0778087104,10.675308583,7.1024090604,8.4847900497,9.5972080849,7.8019649393,7.9293049916,6.9843092231,7.3280989769,9.5304835319,11.135752371,10.865939094,11.997312602,12.341512799,11.342155009,12.714313234,11.84619059,11.959433601,13.990007138,-0.934361131,-4.057943661,-0.19063051,-4.894903542,-3.85672275,-1.744946925,-4.912348295,-3.916885598,-4.975124378,-6.661908161,0.2803083392,0.7549662624,0.476576276,0.8638065073,1.157016825,1.3571809413,1.2521672125,0.9553379508,1.1481056257,0.9517011658,-5.79303901,-10.38078611,-6.672067864,-3.55120453,1.2534348937,-8.821676118,25.524947024,-2.579412467,6.5059318791,13.799666905,-5.51273067,-9.625819846,-6.195491588,-2.687398023,2.4104517187,-7.464495177,26.777114236,-1.624074516,7.6540375048,14.75136807 +050,3,7,48,079,Texas,Cochran County,3127,3127,3147,3083,3029,3013,2948,2979,2913,2847,2816,2825,2897,20,-64,-54,-16,-65,31,-66,-66,-31,9,72,11,57,43,53,46,39,33,43,42,39,39,1,31,29,27,37,33,34,24,25,14,18,10,26,14,26,9,6,-1,19,17,25,21,3,13,7,5,14,17,18,16,13,16,12,8,-104,-76,-49,-90,7,-84,-102,-59,-33,40,11,-91,-69,-44,-76,24,-66,-86,-46,-17,52,-1,1,1,2,2,1,1,1,-2,1,-1,78,78,78,78,78,78,78,78,78,78,78,78,18.298555377,14.070680628,17.543859649,15.433652072,13.160114729,11.201629328,14.930555556,14.833127318,13.827335579,13.631597344,9.9518459069,9.4895287958,8.9374379345,12.414024493,11.135481694,11.541072641,8.3333333333,8.829242451,4.9636589257,6.2915064663,8.3467094703,4.5811518325,8.6064217147,3.0196275793,2.0246330353,-0.339443313,6.5972222222,6.0038848667,8.8636766531,7.3400908773,4.1733547352,2.2905759162,1.655081099,4.6971984566,5.7364602666,6.1099796334,5.5555555556,4.5912060745,5.672753058,4.1943376442,-33.38683788,-24.86910995,-16.21979477,-30.19627579,2.3620718745,-28.51323829,-35.41666667,-20.83701218,-11.70005318,13.981125481,-29.21348315,-22.57853403,-14.56471367,-25.49907734,8.098532141,-22.40325866,-29.86111111,-16.24580611,-6.027300124,18.175463125 +050,3,7,48,081,Texas,Coke County,3320,3316,3318,3264,3198,3175,3211,3220,3255,3278,3317,3316,3323,2,-54,-66,-23,36,9,35,23,39,-1,7,4,28,28,26,28,34,41,32,35,31,34,7,56,55,56,44,50,52,57,45,56,65,-3,-28,-27,-30,-16,-16,-11,-25,-10,-25,-31,0,0,0,0,1,0,0,-1,-1,-1,-1,6,-27,-39,6,51,24,47,49,50,25,40,6,-27,-39,6,52,24,47,48,49,24,39,-1,1,0,1,0,1,-1,0,0,0,-1,35,35,36,36,35,36,36,35,35,34,36,36,8.5080522637,8.6660476633,8.1594225639,8.7691825869,10.573783237,12.664092664,9.7964181846,10.614101592,9.3472033771,10.242506402,17.016104527,17.022593624,17.574140907,13.780144065,15.549681232,16.061776062,17.449869891,13.646702047,16.885270617,19.581262238,-8.508052264,-8.356545961,-9.414718343,-5.010961478,-4.975897994,-3.397683398,-7.653451707,-3.032600455,-7.53806724,-9.338755837,0,0,0,0.3131850924,0,0,-0.306138068,-0.303260045,-0.30152269,-0.301250188,-8.204193254,-12.07056639,1.8829436686,15.972439712,7.4638469911,14.517374517,15.000765345,15.163002274,7.5380672396,12.050007531,-8.204193254,-12.07056639,1.8829436686,16.285624804,7.4638469911,14.517374517,14.694627277,14.859742229,7.23654455,11.748757343 +050,3,7,48,083,Texas,Coleman County,8895,8893,8873,8748,8673,8533,8422,8317,8415,8402,8364,8125,8100,-20,-125,-75,-140,-111,-105,98,-13,-38,-239,-25,19,99,96,96,85,77,72,75,86,77,74,46,111,140,103,157,149,110,139,142,123,125,-27,-12,-44,-7,-72,-72,-38,-64,-56,-46,-51,0,2,7,7,6,6,4,3,3,3,1,8,-116,-36,-140,-46,-36,132,49,16,-195,26,8,-114,-29,-133,-40,-30,136,52,19,-192,27,-1,1,-2,0,1,-3,0,-1,-1,-1,-1,40,40,53,45,43,40,40,49,53,46,16,16,11.236592702,11.021181333,11.158898059,10.026540843,9.2000716889,8.6062634473,8.9195456978,10.258857211,9.3395597065,9.1217257319,12.598603938,16.07255611,11.972567709,18.519610734,17.802736125,13.148458044,16.53089136,16.939043302,14.919036934,15.408320493,-1.362011237,-5.051374778,-0.81366965,-8.493069891,-8.602664436,-4.542194597,-7.611345662,-6.680186091,-5.579477227,-6.286594761,0.2270018728,0.8036278055,0.8136696501,0.7077558242,0.716888703,0.4781257471,0.3567818279,0.357867112,0.3638789496,0.1232665639,-13.16610862,-4.132943,-16.273393,-5.426127986,-4.301332218,15.778149653,5.8274365226,1.9086245974,-23.65213172,3.2049306626,-12.93910675,-3.329315194,-15.45972335,-4.718372162,-3.584443515,16.2562754,6.1842183505,2.2664917094,-23.28825277,3.3281972265 +050,3,7,48,085,Texas,Collin County,782341,780894,787102,812083,834839,856063,884410,915014,944313,972724,1006012,1035072,1072069,6208,24981,22756,21224,28347,30604,29299,28411,33288,29060,36997,2620,10564,10350,10436,10768,10797,11151,10951,11108,11179,11413,747,3265,3309,3527,3705,3925,4050,4334,4654,5075,5752,1873,7299,7041,6909,7063,6872,7101,6617,6454,6104,5661,623,2806,3505,4125,5646,6766,6612,6317,4495,4398,3444,3470,14780,11947,10117,15358,16814,15551,15454,22298,18595,28051,4093,17586,15452,14242,21004,23580,22163,21771,26793,22993,31495,242,96,263,73,280,152,35,23,41,-37,-159,3914,3906,3933,3978,4047,4039,4211,4322,4394,4427,3938,3940,13.211729725,12.568901259,12.343707678,12.373647853,12.000506829,11.994662585,11.424922941,11.227369391,10.953983276,10.832687514,4.0833299462,4.0184052432,4.1717379245,4.2574633447,4.3625071134,4.3564149824,4.5215611384,4.7040130669,4.9728477613,5.4595302355,9.1283997786,8.5504960162,8.1719697534,8.1161845085,7.6379997155,7.6382476025,6.9033618026,6.5233563244,5.9811355143,5.373157278,3.5092875433,4.2564250159,4.8790527186,6.48789151,7.5201842367,7.1122508305,6.5903787981,4.5433044125,4.3094747693,3.268884237,18.484415499,14.508276652,11.966394268,17.648076126,18.688202447,16.727557874,16.122797839,22.537619976,18.220710172,26.624701432,21.993703042,18.764701668,16.845446986,24.135967636,26.208386684,23.839808705,22.713176637,27.080924388,22.530184941,29.893585669 +050,3,7,48,087,Texas,Collingsworth County,3057,3057,3054,3085,3023,3098,3014,3007,3009,2958,2928,2921,2877,-3,31,-62,75,-84,-7,2,-51,-30,-7,-44,14,51,52,44,26,31,37,27,35,34,35,15,48,40,42,31,40,39,30,43,28,32,-1,3,12,2,-5,-9,-2,-3,-8,6,3,1,6,6,5,6,1,1,0,0,0,0,-3,21,-81,66,-87,2,3,-48,-23,-13,-47,-2,27,-75,71,-81,3,4,-48,-23,-13,-47,0,1,1,2,2,-1,0,0,1,0,0,52,52,50,50,47,50,51,52,54,54,54,54,16.61508389,17.026850033,14.376735827,8.5078534031,10.297292809,12.300531915,9.0497737557,11.892626572,11.625918961,12.073128665,15.637726014,13.097576948,13.723247835,10.143979058,13.28682943,12.965425532,10.055304173,14.610941216,9.5742862028,11.038289065,0.9773578759,3.9292730845,0.6534879922,-1.636125654,-2.989536622,-0.664893617,-1.005530417,-2.718314645,2.0516327577,1.0348395999,1.9547157518,1.9646365422,1.6337199804,1.9633507853,0.3321707358,0.3324468085,0,0,0,0,6.8415051311,-26.52259332,21.565103741,-28.46858639,0.6643414715,0.9973404255,-16.08848668,-7.815154604,-4.445204308,-16.21248706,8.7962208829,-24.55795678,23.198823722,-26.5052356,0.9965122073,1.329787234,-16.08848668,-7.815154604,-4.445204308,-16.21248706 +050,3,7,48,089,Texas,Colorado County,20874,20866,20868,20803,20724,20717,20695,20946,21091,21301,21317,21467,21610,2,-65,-79,-7,-22,251,145,210,16,150,143,70,256,231,256,266,251,264,280,249,257,259,84,246,281,297,259,251,248,286,243,259,293,-14,10,-50,-41,7,0,16,-6,6,-2,-34,10,53,43,41,47,77,93,86,66,67,52,10,-129,-69,-4,-76,176,37,131,-54,84,127,20,-76,-26,37,-29,253,130,217,12,151,179,-4,1,-3,-3,0,-2,-1,-1,-2,1,-2,328,328,346,344,305,318,349,348,329,336,319,319,12.286722181,11.125291979,12.354914215,12.846517918,12.055426143,12.560363489,13.21003963,11.685203435,12.013836948,12.024978527,11.806772096,13.533363836,14.333630945,12.508451657,12.055426143,11.799129338,13.493111908,11.403632268,12.107329843,13.603547137,0.4799500852,-2.408071857,-1.97871673,0.338066261,0,0.7612341509,-0.283072278,0.2815711671,-0.093492895,-1.57856861,2.5437354515,2.0709417969,1.9787167298,2.2698734666,3.6982781393,4.4246735019,4.057369315,3.0972828382,3.1320119671,2.4142814031,-6.191356099,-3.323139162,-0.193045535,-3.670433691,8.4532071756,1.7603539739,6.1804113984,-2.534140504,3.9267015707,5.8964180421,-3.647620647,-1.252197366,1.7856711952,-1.400560224,12.151485315,6.1850274758,10.237780713,0.5631423342,7.0587135378,8.3106994452 +050,3,7,48,091,Texas,Comal County,108472,108525,109311,112128,114897,118663,123268,128870,134408,140721,148230,156435,164812,786,2817,2769,3766,4605,5602,5538,6313,7509,8205,8377,312,1258,1283,1352,1384,1528,1572,1454,1504,1573,1626,185,989,1028,1059,1022,1020,1109,1232,1317,1267,1318,127,269,255,293,362,508,463,222,187,306,308,26,68,96,102,169,180,126,91,42,65,54,588,2467,2348,3292,3957,4840,4922,5965,7256,7853,8070,614,2535,2444,3394,4126,5020,5048,6056,7298,7918,8124,45,13,70,79,117,74,27,35,24,-19,-55,1060,1060,1061,1179,1195,1196,1184,1226,1184,1236,1160,1155,11.362045529,11.302719965,11.577324884,11.441278712,12.120346794,11.941749785,10.569587357,10.410069527,10.326095876,10.123051733,8.9324825347,9.0562713358,9.0683336188,8.4486899157,8.090807415,8.4245550331,8.9557989161,9.1157324252,8.3173321517,8.2055240983,2.4295629948,2.246448629,2.5089912656,2.992588796,4.0295393792,3.5171947523,1.6137884411,1.2943371021,2.0087637241,1.9175276345,0.6141646232,0.8457218368,0.8734372324,1.3970925594,1.4277895438,0.9571631507,0.6615078745,0.2907067288,0.4266981767,0.3361899099,22.281531257,20.684946592,28.18975852,32.711806259,38.391674401,37.390135142,43.361477707,50.223048198,51.551704331,50.24171432,22.89569588,21.530668429,29.063195753,34.108898818,39.819463944,38.347298293,44.022985581,50.513754927,51.978402508,50.577904229 +050,3,7,48,093,Texas,Comanche County,13974,13960,13954,13870,13723,13552,13470,13392,13554,13531,13519,13629,13750,-6,-84,-147,-171,-82,-78,162,-23,-12,110,121,29,186,158,155,138,142,178,128,149,145,154,38,161,140,174,205,166,173,193,185,177,205,-9,25,18,-19,-67,-24,5,-65,-36,-32,-51,5,20,-2,2,11,22,19,15,10,9,11,-2,-130,-166,-155,-23,-74,138,28,17,135,161,3,-110,-168,-153,-12,-52,157,43,27,144,172,0,1,3,1,-3,-2,0,-1,-3,-2,0,161,161,165,172,161,151,165,170,150,150,148,148,13.369752731,11.452179901,11.365719523,10.213899785,10.572556027,13.211608402,9.4517260476,11.01663586,10.682186533,11.24949779,11.572742956,10.147501178,12.758936755,15.172822145,12.359466905,12.840495806,14.251430681,13.678373383,13.039634596,14.974980825,1.7970097757,1.3046787229,-1.393217232,-4.95892236,-1.786910878,0.3711125956,-4.799704634,-2.661737523,-2.357448062,-3.725483034,1.4376078206,-0.144964303,0.1466544455,0.8141514322,1.638001638,1.4102278631,1.1076241462,0.7393715342,0.6630322676,0.8035355564,-9.344450834,-12.03203711,-11.36571952,-1.702316631,-5.509641873,10.242707637,2.0675650729,1.2569316081,9.9454840136,11.760838599,-7.906843013,-12.17700141,-11.21906508,-0.888165199,-3.871640235,11.652935501,3.1751892191,1.9963031423,10.608516281,12.564374155 +050,3,7,48,095,Texas,Concho County,4087,4087,4101,4121,4082,4118,4080,4065,4134,2701,2679,2749,2827,14,20,-39,36,-38,-15,69,-1433,-22,70,78,6,33,32,16,25,31,27,18,24,31,29,2,36,29,37,34,33,35,26,37,21,38,4,-3,3,-21,-9,-2,-8,-8,-13,10,-9,2,30,45,20,34,39,40,35,27,32,27,8,-8,-89,34,-64,-53,38,-1481,-36,28,60,10,22,-44,54,-30,-14,78,-1446,-9,60,87,0,1,2,3,1,1,-1,21,0,0,0,1588,1603,1599,1609,1621,1612,1530,1488,39,40,40,40,8.0272439796,7.8020236499,3.9024390244,6.0990485484,7.6120319214,6.586169045,5.2670080468,8.9219330855,11.422254974,10.401721664,8.7569934323,7.0705839327,9.0243902439,8.2947060259,8.1031307551,8.5376265398,7.6079005121,13.75464684,7.7376565954,13.629842181,-0.729749453,0.7314397172,-5.12195122,-2.195657477,-0.491098834,-1.951457495,-2.340892465,-4.832713755,3.6845983788,-3.228120516,7.2974945269,10.971595758,4.8780487805,8.2947060259,9.576427256,9.7572874741,10.241404535,10.037174721,11.790714812,9.6843615495,-1.945998541,-21.69937828,8.2926829268,-15.61356428,-13.01411909,9.2694231004,-433.3577176,-13.38289963,10.316875461,21.520803443,5.3514959864,-10.72778252,13.170731707,-7.318858258,-3.437691835,19.026710574,-423.1163131,-3.345724907,22.107590273,31.205164993 +050,3,7,48,097,Texas,Cooke County,38437,38445,38482,38452,38729,38465,38772,39179,39334,39903,40434,41074,41393,37,-30,277,-264,307,407,155,569,531,640,319,139,475,521,570,528,550,567,559,553,512,541,70,380,415,427,415,397,401,429,394,426,471,69,95,106,143,113,153,166,130,159,86,70,7,54,25,28,53,63,30,23,9,10,13,-35,-179,144,-440,143,196,-38,415,364,545,236,-28,-125,169,-412,196,259,-8,438,373,555,249,-4,0,2,5,-2,-5,-3,1,-1,-1,0,686,686,682,699,678,683,681,659,631,644,607,607,12.348246549,13.500732045,14.767987149,13.672203737,14.111428975,14.443467961,14.109570024,13.767006485,12.563183982,13.120399675,9.8785972392,10.753942032,11.063035987,10.746144982,10.185886005,10.214868875,10.82827467,9.8086809316,10.452961672,11.422750919,2.4696493098,2.7467900131,3.704951162,2.9260587542,3.9255429693,4.2285990855,3.2812953544,3.9583255536,2.1102223095,1.6976487565,1.4038006603,0.6478278333,0.7254449828,1.3723992387,1.6164000462,0.764204654,0.5805368704,0.2240561634,0.2453746871,0.3152776262,-4.653339226,3.7314883197,-11.39984973,3.702888512,5.0288001437,-0.967992562,10.474904401,9.0618270535,13.37292045,5.7235015218,-3.249538566,4.3793161529,-10.67440475,5.0752877507,6.6452001899,-0.203787908,11.055441271,9.2858832169,13.618295137,6.038779148 +050,3,7,48,099,Texas,Coryell County,75388,75475,75654,76656,78515,76827,76245,76242,74924,74886,74791,76543,76737,179,1002,1859,-1688,-582,-3,-1318,-38,-95,1752,194,247,1066,950,1007,1070,1065,983,942,915,876,895,96,412,408,395,429,483,488,460,508,462,508,151,654,542,612,641,582,495,482,407,414,387,149,174,794,417,403,493,295,119,-47,33,61,-116,175,464,-2791,-1651,-1084,-2115,-637,-451,1300,-259,33,349,1258,-2374,-1248,-591,-1820,-518,-498,1333,-198,-5,-1,59,74,25,6,7,-2,-4,5,5,11444,11429,11581,13138,12117,12316,12408,12033,12091,12237,12767,12772,13.997767711,12.244556006,12.96494187,13.980349117,13.968403864,13.005570036,12.575929511,12.226327358,11.577041511,11.677974948,5.4100190401,5.2587145794,5.0855531666,5.6052053935,6.3349662594,6.4564783086,6.1411120753,6.7879500524,6.1056999749,6.6283924843,8.5877486705,6.9858414266,7.8793887036,8.3751437232,7.6334376045,6.549091727,6.4348174354,5.4383773058,5.4713415359,5.0495824635,2.2848138665,10.23387102,5.3687991657,5.2654959757,6.4661249811,3.9029940595,1.5886789934,-0.628019001,0.4361214268,0.7959290188,2.2979449806,5.9804989334,-35.93361744,-21.57154803,-14.21760544,-27.98248283,-8.5041052,-6.026309988,17.180541055,-3.379436326,4.5827588471,16.214369953,-30.56481827,-16.30605205,-7.751480454,-24.07948877,-6.915426207,-6.654328988,17.616662482,-2.583507307 +050,3,7,48,101,Texas,Cottle County,1505,1506,1512,1507,1485,1442,1427,1437,1398,1373,1375,1385,1363,6,-5,-22,-43,-15,10,-39,-25,2,10,-22,9,15,15,10,16,16,10,13,19,8,14,2,21,18,37,28,28,26,26,22,16,11,7,-6,-3,-27,-12,-12,-16,-13,-3,-8,3,0,0,0,0,0,0,0,0,0,0,0,-1,1,-18,-18,-3,21,-22,-12,6,18,-25,-1,1,-18,-18,-3,21,-22,-12,6,18,-25,0,0,-1,2,0,1,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9.9370652534,10.026737968,6.8329347455,11.153712095,11.173184358,7.0546737213,9.382894262,13.828238719,5.7971014493,10.18922853,13.911891355,12.032085561,25.281858558,19.518996166,19.553072626,18.342151675,18.765788524,16.011644833,11.594202899,8.0058224163,-3.974826101,-2.005347594,-18.44892381,-8.365284071,-8.379888268,-11.28747795,-9.382894262,-2.183406114,-5.797101449,2.1834061135,0,0,0,0,0,0,0,0,0,0,0.6624710169,-12.03208556,-12.29928254,-2.091321018,14.664804469,-15.52028219,-8.661133165,4.3668122271,13.043478261,-18.19505095,0.6624710169,-12.03208556,-12.29928254,-2.091321018,14.664804469,-15.52028219,-8.661133165,4.3668122271,13.043478261,-18.19505095 +050,3,7,48,103,Texas,Crane County,4375,4375,4382,4357,4522,4716,4894,4991,4776,4675,4718,4759,4765,7,-25,165,194,178,97,-215,-101,43,41,6,16,65,70,80,80,67,81,69,55,61,56,3,47,31,55,37,39,34,38,37,24,32,13,18,39,25,43,28,47,31,18,37,24,0,2,2,10,10,11,11,5,4,5,5,-6,-46,121,158,121,59,-274,-139,21,-1,-23,-6,-44,123,168,131,70,-263,-134,25,4,-18,0,1,3,1,4,-1,1,2,0,0,0,86,86,86,93,94,89,90,87,87,90,87,87,14.875843918,15.76754139,17.319766183,16.649323621,13.555892767,16.586464626,14.601629457,11.710848504,12.873272133,11.759764805,10.756379448,6.9827683298,11.907339251,7.7003121748,7.8907435508,6.9622197195,8.0414770924,7.8782071756,5.0648939538,6.7198656027,4.1194644696,8.78477306,5.4124269322,8.9490114464,5.665149216,9.6242449063,6.5601523648,3.8326413286,7.8083781787,5.039899202,0.4577182744,0.4505011826,2.1649707729,2.0811654527,2.2255943349,2.2524828504,1.0580890911,0.851698073,1.0551862404,1.0499790004,-10.52752031,27.255321545,34.206538212,25.182101977,11.937278705,-56.10730009,-29.41487673,4.4714148834,-0.211037248,-4.829903402,-10.06980204,27.705822728,36.371508985,27.26326743,14.16287304,-53.85481724,-28.35678764,5.3231129565,0.8441489923,-3.779924402 +050,3,7,48,105,Texas,Crockett County,3719,3719,3701,3655,3707,3765,3791,3736,3652,3528,3448,3468,3513,-18,-46,52,58,26,-55,-84,-124,-80,20,45,17,57,61,47,60,50,63,28,38,32,35,19,45,37,30,32,27,36,37,45,29,21,-2,12,24,17,28,23,27,-9,-7,3,14,1,2,10,7,9,5,1,1,0,0,0,-16,-62,20,33,-10,-84,-114,-116,-72,18,30,-15,-60,30,40,-1,-79,-113,-115,-72,18,30,-1,2,-2,1,-1,1,2,0,-1,-1,1,49,49,41,42,46,41,40,39,37,20,25,26,15.497553018,16.571583809,12.580299786,15.88141874,13.285505513,17.05468327,7.7994428969,10.894495413,9.2539039907,10.027216731,12.234910277,10.051616409,8.0299785867,8.4700899947,7.1741729773,9.7455332972,10.306406685,12.901376147,8.3863504916,6.0163300387,3.2626427406,6.5199674002,4.5503211991,7.4113287454,6.1113325362,7.3091499729,-2.506963788,-2.006880734,0.8675534991,4.0108866925,0.5437737901,2.7166530834,1.8736616702,2.382212811,1.3285505513,0.2707092583,0.278551532,0,0,0,-16.85698749,5.4333061668,8.8329764454,-2.646903123,-22.31964926,-30.86085544,-32.31197772,-20.64220183,5.2053209948,8.5947571981,-16.3132137,8.1499592502,10.706638116,-0.264690312,-20.99109871,-30.59014618,-32.03342618,-20.64220183,5.2053209948,8.5947571981 +050,3,7,48,107,Texas,Crosby County,6059,6056,6025,6041,6033,5923,5826,5918,5905,5850,5743,5701,5567,-31,16,-8,-110,-97,92,-13,-55,-107,-42,-134,19,87,72,66,74,102,72,64,70,74,73,40,71,67,60,61,85,67,73,70,79,63,-21,16,5,6,13,17,5,-9,0,-5,10,0,5,3,2,1,1,3,1,1,3,1,-10,-3,-18,-121,-112,75,-21,-46,-109,-41,-144,-10,2,-15,-119,-111,76,-18,-45,-108,-38,-143,0,-2,2,3,1,-1,0,-1,1,1,-1,62,62,62,63,66,66,61,65,62,67,63,63,14.420686226,11.926453537,11.040481766,12.59681675,17.370572207,12.179649835,10.888983411,12.076252911,12.93254107,12.957046503,11.768606,11.098227596,10.036801606,10.383862456,14.475476839,11.333840819,12.420246704,12.076252911,13.806361412,11.182108626,2.6520802254,0.82822594,1.0036801606,2.212954294,2.8950953678,0.8458090163,-1.531263292,0,-0.873820343,1.7749378772,0.8287750704,0.496935564,0.3345600535,0.1702272534,0.1702997275,0.5074854098,0.1701403658,0.1725178987,0.5242922055,0.1774937877,-0.497265042,-2.981613384,-20.24088324,-19.06545238,12.772479564,-3.552397869,-7.826456827,-18.80445096,-7.165326809,-25.55910543,0.3315100282,-2.48467782,-19.90632319,-18.89522513,12.942779292,-3.044912459,-7.656316461,-18.63193306,-6.641034603,-25.38161164 +050,3,7,48,109,Texas,Culberson County,2398,2398,2404,2393,2317,2305,2282,2252,2216,2227,2176,2146,2149,6,-11,-76,-12,-23,-30,-36,11,-51,-30,3,7,27,33,30,26,31,30,36,27,24,23,2,14,15,19,17,9,23,22,17,19,21,5,13,18,11,9,22,7,14,10,5,2,1,6,1,-1,1,0,0,0,0,0,0,-1,-29,-98,-22,-34,-52,-43,-3,-62,-35,2,0,-23,-97,-23,-33,-52,-43,-3,-62,-35,2,1,-1,3,0,1,0,0,0,1,0,-1,12,12,12,12,12,12,12,12,12,12,12,12,11.257035647,14.012738854,12.981393336,11.336385437,13.674459638,13.428827216,16.205266712,12.264365206,11.105969459,10.710128056,5.8369814467,6.3694267516,8.2215491129,7.4122520166,3.9700044111,10.295434199,9.903218546,7.722007722,8.7922258214,9.7788125728,5.4200542005,7.6433121019,4.7598442233,3.9241334205,9.7044552272,3.133393017,6.3020481657,4.5423574835,2.3137436372,0.9313154831,2.5015634772,0.4246284501,-0.432713111,0.4360148245,0,0,0,0,0,0,-12.09089014,-41.61358811,-9.519688447,-14.82450403,-22.93780326,-19.24798568,-1.350438893,-28.1626164,-16.19620546,0.9313154831,-9.589326662,-41.18895966,-9.952401558,-14.38848921,-22.93780326,-19.24798568,-1.350438893,-28.1626164,-16.19620546,0.9313154831 +050,3,7,48,111,Texas,Dallam County,6703,6698,6745,6887,7058,7111,7214,7301,7321,7248,7262,7255,7273,47,142,171,53,103,87,20,-73,14,-7,18,25,137,136,151,141,152,147,154,151,156,151,1,42,60,46,48,40,39,61,34,32,51,24,95,76,105,93,112,108,93,117,124,100,5,28,29,22,35,62,81,55,43,56,40,16,19,67,-73,-24,-88,-169,-222,-146,-187,-121,21,47,96,-51,11,-26,-88,-167,-103,-131,-81,2,0,-1,-1,-1,1,0,1,0,0,-1,39,39,39,39,39,39,39,39,39,39,39,39,20.099765258,19.505198996,21.314136495,19.685863874,20.943851188,20.106688551,21.140778365,20.813232254,21.492043811,20.787444934,6.161971831,8.6052348512,6.4930482038,6.7015706806,5.5115397864,5.3344275749,8.3739446771,4.6864231564,4.4086243714,7.0209251101,13.937793427,10.899964145,14.821088291,12.984293194,15.432311402,14.772260977,12.766833688,16.126809097,17.083419439,13.766519824,4.1079812207,4.1591968447,3.1053708801,4.8865619546,8.542886669,11.079195732,7.5502779875,5.9269469331,7.71509265,5.5066079295,2.7875586854,9.6091789172,-10.30418519,-3.35078534,-12.12538753,-23.11585282,-30.47566751,-20.12405238,-25.76289867,-16.65748899,6.8955399061,13.768375762,-7.198814313,1.5357766143,-3.582500861,-12.03665709,-22.92538953,-14.19710544,-18.04780602,-11.15088106 +050,3,7,48,113,Texas,Dallas County,2368139,2368156,2373711,2409257,2456296,2484675,2519407,2557615,2591488,2620425,2629764,2635603,2635888,5555,35546,47039,28379,34732,38208,33873,28937,9339,5839,285,9738,39037,38574,38847,39267,40128,40059,39981,38697,38072,37726,3412,14316,14316,15071,15264,15709,15789,16288,16662,16965,18457,6326,24721,24258,23776,24003,24419,24270,23693,22035,21107,19269,2001,9894,10554,10062,13791,15605,15389,13709,9951,9889,7924,-2706,982,12005,-5156,-2520,-1586,-5678,-8325,-22613,-25150,-26911,-705,10876,22559,4906,11271,14019,9711,5384,-12662,-15261,-18987,-66,-51,222,-303,-542,-230,-108,-140,-34,-7,3,30398,30419,31216,31592,32301,31366,32228,32066,31604,31480,30846,30844,16.323337309,15.855957175,15.724439589,15.693987429,15.80769199,15.559603294,15.342159395,14.741183603,14.461290163,14.313218025,5.9862411791,5.8846342851,6.1004203425,6.1006194543,6.1882733618,6.1327186502,6.2502961964,6.3472000722,6.4439952619,7.0025728964,10.337096129,9.9713228897,9.6240192464,9.5933679744,9.6194186277,9.4268846438,9.0918631988,8.3939835309,8.0172949008,7.3106451287,4.137180094,4.3382530208,4.0728836498,5.5119000848,6.1473044631,5.9773517834,5.2606403829,3.7907206769,3.756243392,3.0063600602,0.4106236964,4.9346908769,-2.087039167,-1.00717774,-0.624775705,-2.205432674,-3.194604361,-8.61416608,-9.552990323,-10.21001459,4.5478037904,9.2729438976,1.9858444828,4.5047223447,5.522528758,3.771919109,2.0660360217,-4.823445404,-5.796746931,-7.203654526 +050,3,7,48,115,Texas,Dawson County,13833,13833,13826,13750,13614,13224,13451,13000,13000,12734,12551,12985,12974,-7,-76,-136,-390,227,-451,0,-266,-183,434,-11,36,193,198,182,172,189,194,180,181,198,196,53,136,132,142,148,141,135,131,140,115,128,-17,57,66,40,24,48,59,49,41,83,68,1,14,15,23,29,27,11,7,5,9,8,10,-146,-219,-476,166,-537,-71,-323,-231,342,-86,11,-132,-204,-453,195,-510,-60,-316,-226,351,-78,-1,-1,2,23,8,11,1,1,2,0,-1,2146,2154,2195,2201,1645,1807,1344,1348,1352,1331,1608,1602,13.997679141,14.471568484,13.562858633,12.895970009,14.290575026,14.923076923,13.989274889,14.31678861,15.507518797,15.100735776,9.8636495503,9.6477123228,10.582010582,11.096532334,10.661222638,10.384615385,10.181083392,11.073759146,9.0068922306,9.8617049963,4.1340295909,4.8238561614,2.9808480513,1.7994376757,3.6293523874,4.5384615385,3.8081914976,3.2430294641,6.5006265664,5.2390307793,1.015375689,1.0963309458,1.7139876295,2.1743205248,2.0415107179,0.8461538462,0.5440273568,0.3954913981,0.704887218,0.6163565623,-10.5889179,-16.00643181,-35.47209181,12.44611059,-40.60337983,-5.461538462,-25.10297661,-18.27170259,26.785714286,-6.625833044,-9.573542211,-14.91010086,-33.75810418,14.620431115,-38.56186912,-4.615384615,-24.55894925,-17.87621119,27.490601504,-6.009476482 +050,3,7,48,117,Texas,Deaf Smith County,19372,19372,19465,19519,19369,19174,19116,18819,18823,18742,18686,18559,18277,93,54,-150,-195,-58,-297,4,-81,-56,-127,-282,83,351,339,369,318,352,325,317,341,329,314,12,141,146,152,168,153,143,155,152,136,169,71,210,193,217,150,199,182,162,189,193,145,21,70,27,14,22,11,13,-2,-6,2,1,1,-227,-382,-434,-235,-512,-192,-241,-239,-322,-427,22,-157,-355,-420,-213,-501,-179,-243,-245,-320,-426,0,1,12,8,5,5,1,0,0,0,-1,371,371,370,369,368,369,365,361,348,355,359,359,18.007387646,17.434684221,19.14744571,16.610080961,18.558059839,17.26794538,16.877412485,18.221652239,17.666800913,17.048539472,7.2337369177,7.508743057,7.8872947098,8.7751371115,8.0664294187,7.5978959673,8.2523625715,8.1222614086,7.3029936904,9.1758062765,10.773650729,9.9259411644,11.260151,7.8349438496,10.49163042,9.6700494129,8.6250499135,10.09939083,10.363807222,7.8727331958,3.5912169095,1.3886031681,0.7264613549,1.1491250979,0.57993937,0.6907178152,-0.106482098,-0.320615582,0.107396966,0.0542947117,-11.64580341,-19.64616334,-22.520302,-12.27474536,-26.99354158,-10.20137081,-12.83109277,-12.77118735,-17.29091153,-23.18384189,-8.054586497,-18.25756017,-21.79384065,-11.12562027,-26.41360221,-9.510652994,-12.93757487,-13.09180293,-17.18351457,-23.12954718 +050,3,7,48,119,Texas,Delta County,5231,5232,5242,5145,5240,5117,5137,5154,5131,5268,5311,5327,5349,10,-97,95,-123,20,17,-23,137,43,16,22,15,57,63,54,65,76,56,64,72,71,75,26,82,80,82,82,73,74,69,74,59,51,-11,-25,-17,-28,-17,3,-18,-5,-2,12,24,2,0,0,0,0,0,0,0,0,0,0,19,-73,109,-97,36,15,-5,142,46,4,-2,21,-73,109,-97,36,15,-5,142,46,4,-2,0,1,3,2,1,-1,0,0,-1,0,0,69,69,67,68,67,62,62,55,53,54,54,54,10.975257533,12.132883967,10.427730038,12.677979325,14.770187543,10.889645114,12.308875853,13.611872578,13.348373754,14.05020607,15.788966978,15.406836784,15.834701168,15.993758533,14.187153824,14.389888187,13.270506779,13.989980149,11.092310585,9.5541401274,-4.813709444,-3.273952817,-5.406971131,-3.315779208,0.5830337188,-3.500243072,-0.961630926,-0.378107572,2.2560631698,4.4960659423,0,0,0,0,0,0,0,0,0,0,-14.05603158,20.991815118,-18.73129285,7.0216500878,2.9151685939,-0.972289742,27.3103183,8.6964741469,0.7520210566,-0.374672162,-14.05603158,20.991815118,-18.73129285,7.0216500878,2.9151685939,-0.972289742,27.3103183,8.6964741469,0.7520210566,-0.374672162 +050,3,7,48,121,Texas,Denton County,662614,661615,665833,684842,707027,727776,752355,778799,807566,834649,858148,888765,919324,4218,19009,22185,20749,24579,26444,28767,27083,23499,30617,30559,2192,9219,9109,9496,9734,9916,10171,9930,9902,9966,10151,689,2734,2891,3036,3141,3350,3478,3718,3852,4380,5077,1503,6485,6218,6460,6593,6566,6693,6212,6050,5586,5074,405,2008,2112,2018,2592,3047,2878,2655,1878,1726,1395,2150,10446,13433,12014,14981,16614,19084,18106,15496,23329,24196,2555,12454,15545,14032,17573,19661,21962,20761,17374,25055,25591,160,70,422,257,413,217,112,110,75,-24,-106,10344,10345,10196,10656,10479,10588,11127,11517,11012,11327,11784,11790,13.650952302,13.088875462,13.236660364,13.152889846,12.952322235,12.823026227,12.093422603,11.698981036,11.409841246,11.228429574,4.0483461973,4.1541265737,4.2319398552,4.2442189239,4.375784539,4.3848672909,4.528030739,4.551047763,5.0145599695,5.6158739974,9.6026061044,8.934748888,9.0047205087,8.9086709217,8.5765376964,8.4381589357,7.565391864,7.1479332726,6.3952812762,5.6125555766,2.9733281507,3.0347683582,2.8129297193,3.5023926936,3.980004624,3.6284209498,3.2334377655,2.2188130059,1.9760571935,1.5430656345,15.467821645,19.302103862,16.746549875,20.242802833,21.701278905,24.060036625,22.050705906,18.30816099,26.708828659,26.764169242,18.441149795,22.33687222,19.559479594,23.745195527,25.681283529,27.688457574,25.284143672,20.526973996,28.684885853,28.307234876 +050,3,7,48,123,Texas,DeWitt County,20097,20097,20055,20207,20360,20381,20519,20632,20598,20164,20042,20105,20174,-42,152,153,21,138,113,-34,-434,-122,63,69,58,223,243,261,278,304,243,238,228,238,226,91,261,218,254,246,267,273,260,306,221,221,-33,-38,25,7,32,37,-30,-22,-78,17,5,1,5,1,1,5,6,-5,-5,-2,-11,-5,-6,184,124,17,102,70,4,-407,-43,59,68,-5,189,125,18,107,76,-1,-412,-45,48,63,-4,1,3,-4,-1,0,-3,0,1,-2,1,1790,1790,1824,1842,1842,1845,1836,1814,1838,1827,1800,1793,11.07744275,11.980180935,12.812645738,13.594132029,14.774853588,11.78753335,11.677542809,11.341590807,11.856427628,11.221728444,12.965078734,10.747652032,12.469011561,12.029339853,12.976598382,13.24278438,12.75697954,15.221608715,11.009539941,10.973460116,-1.887635984,1.2325289028,0.3436341769,1.564792176,1.7982552064,-1.455251031,-1.07943673,-3.880017908,0.8468876877,0.2482683284,0.2483731558,0.0493011561,0.0490905967,0.2444987775,0.2916089524,-0.242541838,-0.24532653,-0.099487639,-0.547986151,-0.248268328,9.1401321345,6.1133433579,0.8345401438,4.9877750611,3.4021044446,0.1940334708,-19.96957951,-2.138984231,2.9391984457,3.3764492664,9.3885052903,6.162644514,0.8836307405,5.2322738386,3.693713397,-0.048508368,-20.21490604,-2.23847187,2.3912122948,3.128180938 +050,3,7,48,125,Texas,Dickens County,2444,2441,2447,2402,2324,2299,2214,2203,2191,2192,2200,2185,2140,6,-45,-78,-25,-85,-11,-12,1,8,-15,-45,2,20,22,25,20,14,21,23,17,16,16,2,21,34,25,39,23,28,26,35,15,21,0,-1,-12,0,-19,-9,-7,-3,-18,1,-5,0,2,3,1,4,0,1,1,1,0,1,6,-47,-70,-28,-72,0,-7,1,25,-16,-41,6,-45,-67,-27,-68,0,-6,2,26,-16,-40,0,1,1,2,2,-2,1,2,0,0,0,315,315,315,315,315,315,315,315,315,315,315,315,8.2491235306,9.3101988997,10.815487778,8.8632838467,6.3391442155,9.5584888484,10.495094684,7.7413479053,7.2976054732,7.3988439306,8.6615797072,14.388489209,10.815487778,17.283403501,10.414308354,12.744651798,11.864020078,15.938069217,6.8415051311,9.710982659,-0.412456177,-5.078290309,0,-8.420119654,-4.075164139,-3.186162949,-1.368925394,-8.196721311,0.4561003421,-2.312138728,0.8249123531,1.2695725772,0.4326195111,1.7726567693,0,0.4551661356,0.4563084645,0.4553734062,0,0.4624277457,-19.3854403,-29.62336014,-12.11334631,-31.90782185,0,-3.186162949,0.4563084645,11.384335155,-7.297605473,-18.95953757,-18.56052794,-28.35378756,-11.6807268,-30.13516508,0,-2.730996814,0.912616929,11.839708561,-7.297605473,-18.49710983 +050,3,7,48,127,Texas,Dimmit County,9996,9996,10043,10109,10472,10898,10993,10914,10676,10281,10176,10104,9925,47,66,363,426,95,-79,-238,-395,-105,-72,-179,32,149,185,200,194,184,161,149,115,136,131,9,82,90,93,95,116,96,85,84,81,81,23,67,95,107,99,68,65,64,31,55,50,2,5,22,18,8,-4,-4,-6,-6,-6,-6,21,-5,240,294,-12,-143,-300,-455,-132,-121,-222,23,0,262,312,-4,-147,-304,-461,-138,-127,-228,1,-1,6,7,0,0,1,2,2,0,-1,104,104,103,104,103,96,100,85,94,92,89,87,14.787614133,17.977746465,18.717828732,17.724178886,16.798283654,14.914312182,14.219592499,11.243095273,13.412228797,13.081032503,8.1381500595,8.7459307128,8.7037903603,8.6793659495,10.590222303,8.8930060213,8.1118480699,8.2123478516,7.9881656805,8.0882720056,6.649464073,9.2318157524,10.014038372,9.0448129368,6.2080613503,6.0213061603,6.1077444291,3.0307474214,5.4240631164,4.9927604973,0.4962286622,2.1378941742,1.6846045859,0.7308939747,-0.365180079,-0.370541918,-0.57260104,-0.586596275,-0.591715976,-0.59913126,-0.496228662,23.322481901,27.515208236,-1.096340962,-13.05518784,-27.79064382,-43.42224555,-12.90511805,-11.93293886,-22.16785661,0,25.460376075,29.199812822,-0.365446987,-13.42036792,-28.16118573,-43.99484659,-13.49171433,-12.52465483,-22.76698787 +050,3,7,48,129,Texas,Donley County,3677,3726,3734,3686,3645,3561,3483,3390,3387,3334,3292,3263,3308,8,-48,-41,-84,-78,-93,-3,-53,-42,-29,45,12,34,29,34,28,35,36,29,37,29,28,13,53,49,61,42,57,49,49,51,35,43,-1,-19,-20,-27,-14,-22,-13,-20,-14,-6,-15,1,3,2,2,1,2,1,1,1,1,1,8,-31,-24,-60,-68,-74,9,-33,-29,-24,59,9,-28,-22,-58,-67,-72,10,-32,-28,-23,60,0,-1,1,1,3,1,0,-1,0,0,0,291,291,289,288,288,263,204,188,225,230,224,224,9.1644204852,7.911608239,9.4365806273,7.950028393,10.184781027,10.624169987,8.6296682041,11.168125566,8.8482074752,8.5222949323,14.285714286,13.367889783,16.930335831,11.925042589,16.586643387,14.460675815,14.581163517,15.393902807,10.678871091,13.087810075,-5.121293801,-5.456281544,-7.493755204,-3.975014196,-6.40186236,-3.836505829,-5.951495313,-4.225777241,-1.830663616,-4.565515142,0.8086253369,0.5456281544,0.5550929781,0.2839295855,0.5819874873,0.295115833,0.2975747657,0.3018412315,0.3051106026,0.3043676762,-8.355795148,-6.547537853,-16.65278934,-19.30721181,-21.53353703,2.6560424967,-9.819967267,-8.753395714,-7.322654462,17.957692893,-7.547169811,-6.001909699,-16.09769636,-19.02328223,-20.95154954,2.9511583296,-9.522392501,-8.451554482,-7.01754386,18.262060569 +050,3,7,48,131,Texas,Duval County,11782,11758,11705,11778,11564,11563,11487,11313,11411,11239,11124,11139,11058,-53,73,-214,-1,-76,-174,98,-172,-115,15,-81,39,172,181,161,172,178,174,152,142,145,149,40,112,119,137,131,132,149,139,126,133,153,-1,60,62,24,41,46,25,13,16,12,-4,1,0,0,4,-1,8,10,2,0,5,3,-55,13,-289,-27,-118,-231,64,-187,-131,-2,-80,-54,13,-289,-23,-119,-223,74,-185,-131,3,-77,2,0,13,-2,2,3,-1,0,0,0,0,578,578,673,541,576,547,525,637,665,585,601,601,14.648894945,15.508525405,13.923120163,14.924078091,15.614035088,15.314205246,13.421633554,12.699548361,13.026097112,13.425237645,9.5388153132,10.196212835,11.847623989,11.36659436,11.578947368,13.1138884,12.273730684,11.268613335,11.948075282,13.785646709,5.1100796321,5.3123125696,2.0754961733,3.557483731,4.0350877193,2.2003168456,1.1479028698,1.4309350266,1.0780218299,-0.360409064,0,0,0.3459160289,-0.086767896,0.701754386,0.8801267383,0.1766004415,0,0.4491757625,0.2703067982,1.1071839203,-24.76223117,-2.334933195,-10.23861171,-20.26315789,5.6328111248,-16.51214128,-11.71578053,-0.179670305,-7.208181286,1.1071839203,-24.76223117,-1.989017166,-10.32537961,-19.56140351,6.5129378631,-16.33554084,-11.71578053,0.2695054575,-6.937874488 +050,3,7,48,133,Texas,Eastland County,18583,18582,18595,18583,18461,18279,18259,18151,18233,18278,18278,18267,18388,13,-12,-122,-182,-20,-108,82,45,0,-11,121,49,220,184,176,216,211,213,204,196,197,189,47,267,230,257,256,275,271,248,262,239,270,2,-47,-46,-81,-40,-64,-58,-44,-66,-42,-81,2,11,25,23,14,21,3,-4,-4,-4,-3,11,24,-97,-125,8,-63,138,95,70,35,207,13,35,-72,-102,22,-42,141,91,66,31,204,-2,0,-4,1,-2,-2,-1,-2,0,0,-2,885,885,885,877,881,917,896,845,816,873,779,779,11.834956157,9.9341323831,9.5808383234,11.823307242,11.590222466,11.708443272,11.17471447,10.723273881,10.781228622,10.312372118,14.363333154,12.417665479,13.990201415,14.012808583,15.105740181,14.896657872,13.584947002,14.334172229,13.079764674,14.731960169,-2.528376997,-2.483533096,-4.409363092,-2.189501341,-3.515517715,-3.1882146,-2.410232533,-3.610898348,-2.298536051,-4.419588051,0.5917478078,1.3497462477,1.2520413718,0.7663254694,1.1535292502,0.1649076517,-0.219112048,-0.218842324,-0.218908195,-0.163688446,1.2910861262,-5.237015441,-6.804572673,0.4379002682,-3.460587751,7.5857519789,5.2039111501,3.8297406718,1.9154467095,11.294502796,1.882833934,-3.887269193,-5.552531301,1.2042257376,-2.3070585,7.7506596306,4.9847991016,3.6108983477,1.6965385142,11.13081435 +050,3,7,48,135,Texas,Ector County,137130,137131,137060,139631,144472,149629,154553,159859,157748,156823,161859,166204,167701,-71,2571,4841,5157,4924,5306,-2111,-925,5036,4345,1497,576,2408,2585,2846,3040,3170,2877,2744,2890,3015,3059,218,1241,1111,1179,1149,1200,1149,1197,1244,1218,1324,358,1167,1474,1667,1891,1970,1728,1547,1646,1797,1735,-34,10,122,167,302,406,401,294,221,232,186,-412,1387,3136,3232,2640,2886,-4258,-2782,3157,2313,-442,-446,1397,3258,3399,2942,3292,-3857,-2488,3378,2545,-256,17,7,109,91,91,44,18,16,12,3,18,2175,2175,2180,2287,2307,2484,2541,2821,2492,2424,2508,2505,17.405698053,18.197625509,19.35389543,19.98803348,20.16462476,18.116729165,17.445981988,18.137202603,18.380615918,18.322576781,8.9702953837,7.8211071337,8.0176537992,7.5546876541,7.6332964391,7.2353569033,7.6103645918,7.8071557226,7.4254030476,7.9303993651,8.4354026694,10.376518375,11.336241631,12.433345826,12.531328321,10.881372262,9.8356173964,10.330046881,10.955212871,10.392177416,0.0722827992,0.8588434476,1.1356642786,1.985653326,2.5825986286,2.5251332622,1.8692123559,1.386962552,1.4143624853,1.1140893368,10.025624252,22.076500424,21.978844003,17.358029075,18.358077936,-26.81301105,-17.68758086,19.812854193,14.100950122,-2.647459607,10.097907052,22.935343872,23.114508281,19.343682401,20.940676565,-24.28787779,-15.81836851,21.199816745,15.515312608,-1.53337027 +050,3,7,48,137,Texas,Edwards County,2002,2002,1999,1979,1990,1899,1904,1911,1915,1931,1903,1915,1923,-3,-20,11,-91,5,7,4,16,-28,12,8,9,25,28,18,25,23,29,20,24,20,22,2,16,22,18,16,31,30,25,24,19,9,7,9,6,0,9,-8,-1,-5,0,1,13,0,2,3,1,1,-1,-1,-1,-1,-2,-1,-9,-30,2,-94,-6,17,5,24,-27,14,-3,-9,-28,5,-93,-5,16,4,23,-28,12,-4,-1,-1,0,2,1,-1,1,-2,0,-1,-1,5,5,5,5,5,5,5,5,5,5,5,5,12.569130216,14.109347443,9.2568783749,13.14751512,12.057667104,15.159435442,10.400416017,12.519561815,10.476689366,11.464304325,8.0442433384,11.085915848,9.2568783749,8.4144096766,16.25163827,15.682174595,13.000520021,12.519561815,9.9528548979,4.6899426785,4.5248868778,3.0234315949,0,4.7331054431,-4.193971166,-0.522739153,-2.600104004,0,0.5238344683,6.7743616467,1.0055304173,1.5117157974,0.5142710208,0.5259006048,-0.524246396,-0.522739153,-0.520020801,-0.521648409,-1.047668937,-0.521104742,-15.08295626,1.0078105316,-48.34147596,-3.155403629,8.9121887287,2.6136957658,12.48049922,-14.08450704,7.3336825563,-1.563314226,-14.07742584,2.5195263291,-47.82720494,-2.629503024,8.3879423329,2.0909566127,11.960478419,-14.60615545,6.2860136197,-2.084418968 +050,3,7,48,139,Texas,Ellis County,149610,149649,150408,152419,153779,155972,159239,163331,168367,173434,179094,184765,191760,759,2011,1360,2193,3267,4092,5036,5067,5660,5671,6995,483,2001,1887,1913,2108,2153,2163,2191,2278,2230,2262,194,984,1112,1100,1145,1153,1208,1295,1290,1447,1546,289,1017,775,813,963,1000,955,896,988,783,716,1,44,119,63,138,128,162,69,35,60,45,452,950,495,1319,2141,2943,3908,4094,4628,4842,6279,453,994,614,1382,2279,3071,4070,4163,4663,4902,6324,17,0,-29,-2,25,21,11,8,9,-14,-45,1610,1610,1622,1615,1711,1693,1619,1652,1656,1547,1489,1489,13.215466256,12.325358102,12.351856814,13.375167745,13.349040518,13.041983973,12.820325277,12.923796124,12.257495348,12.015138437,6.4987600181,7.2632740906,7.102479088,7.2649748898,7.1488359116,7.283733999,7.5775085503,7.3185676031,7.9536303898,8.2119381183,6.7167062382,5.062084011,5.249377726,6.1101928549,6.2002046068,5.7582499744,5.2428167267,5.6052285209,4.3038649587,3.8032003187,0.2905949602,0.7772748352,0.4067783478,0.8756039605,0.7936261897,0.9767921422,0.4037436988,0.1985657877,0.3297980811,0.239027953,6.2742093671,3.2332020457,8.5165181065,13.584551301,18.247202158,23.563603036,23.955459463,26.25607044,26.614705147,33.352367041,6.5648043272,4.010476881,8.9232964542,14.460155261,19.040828347,24.540395179,24.359203162,26.454636227,26.944503228,33.591394994 +050,3,7,48,141,Texas,El Paso County,800647,800634,803548,819796,832118,830585,833370,831382,834112,836087,835590,837501,841286,2914,16248,12322,-1533,2785,-1988,2730,1975,-497,1911,3785,3289,13816,13929,13678,13563,13695,13372,12615,11865,11461,11572,1131,4778,4821,4843,4920,5302,5234,5252,5433,5521,5844,2158,9038,9108,8835,8643,8393,8138,7363,6432,5940,5728,321,1958,3706,2136,2559,2680,2096,560,-118,100,289,477,5240,-303,-12761,-8496,-13194,-7506,-5943,-6819,-4157,-2283,798,7198,3403,-10625,-5937,-10514,-5410,-5383,-6937,-4057,-1994,-42,12,-189,257,79,133,2,-5,8,28,51,15792,15823,15815,16347,15296,15757,14798,14200,15931,17209,16669,16662,17.021654067,16.864074038,16.452727877,16.302123555,16.452901093,16.057698196,15.105984377,14.195326011,13.700390475,13.786144401,5.8866142974,5.8368655995,5.8254540949,5.9136214621,6.3697175315,6.2852222824,6.289070943,6.5000595211,6.5997605629,6.9621697094,11.13503977,11.027208438,10.627273783,10.388502093,10.083183561,9.7724759141,8.8169134337,7.6952664899,7.1006299119,6.8239746913,2.4123044777,4.4869163891,2.5693103338,3.0758043337,3.21969879,2.5169709408,0.6705787753,-0.141175598,0.1195392241,0.3442962091,6.455809736,-0.366847185,-15.34970467,-10.21181462,-15.85100964,-9.013541928,-7.116517253,-8.158274595,-4.969245546,-2.719820918,8.8681142136,4.1200692046,-12.78039433,-7.136010289,-12.63131085,-6.496570987,-6.445938478,-8.299450193,-4.849706322,-2.375524709 +050,3,7,48,143,Texas,Erath County,37890,37895,37913,38925,39408,39893,40525,41200,41375,41744,42251,42536,43224,18,1012,483,485,632,675,175,369,507,285,688,119,457,488,504,532,470,455,505,475,477,478,81,321,309,273,322,308,359,365,349,347,387,38,136,179,231,210,162,96,140,126,130,91,7,27,28,3,6,23,19,10,-2,-2,1,-27,843,273,241,404,485,61,218,383,157,597,-20,870,301,244,410,508,80,228,381,155,598,0,6,3,10,12,5,-1,1,0,0,-1,1888,1888,2656,2823,3254,3715,3941,3904,3753,3684,3515,3518,11.895156043,12.459627488,12.711062912,13.230868711,11.501988376,11.02028459,12.151253023,11.310197036,11.251724911,11.14738806,8.3552408964,7.889395274,6.8851590774,8.0081573777,7.5374732334,8.6951256434,8.7825888184,8.3100184535,8.1852170734,9.0251865672,3.5399151462,4.5702322138,5.8259038348,5.2227113333,3.9645151422,2.3251589464,3.3686642043,3.0001785821,3.0665078373,2.1222014925,0.7027772717,0.7148966591,0.0756610888,0.1492203238,0.5628632609,0.4601877081,0.2406188717,-0.047621882,-0.047177044,0.0233208955,21.942268149,6.9702424266,6.078107464,10.047501803,11.869073111,1.4774447472,5.2454914039,9.1195904518,3.7033979266,13.922574627,22.64504542,7.6851390857,6.1537685527,10.196722127,12.431936372,1.9376324553,5.4861102756,9.0719685696,3.6562208829,13.945895522 +050,3,7,48,145,Texas,Falls County,17866,17866,17895,17853,17572,17244,17211,17215,17279,17342,17225,17282,17275,29,-42,-281,-328,-33,4,64,63,-117,57,-7,50,193,207,200,212,211,225,207,189,204,201,22,198,208,171,188,198,188,186,189,184,186,28,-5,-1,29,24,13,37,21,0,20,15,0,13,11,12,12,-2,1,-1,-2,-2,-1,1,-47,-297,-380,-67,-5,26,44,-114,39,-22,1,-34,-286,-368,-55,-7,27,43,-116,37,-23,0,-3,6,11,-2,-2,0,-1,-1,0,1,2068,2068,2024,1980,1751,1958,1977,1918,1940,1944,1938,1936,10.79780687,11.686661962,11.488970588,12.305906255,12.258176959,13.045747086,11.958060137,10.935285099,11.823687947,11.63295425,11.0775428,11.743119266,9.8230698529,10.912784792,11.502933829,10.900446454,10.744923601,10.935285099,10.664502854,10.764823335,-0.279735929,-0.056457304,1.6659007353,1.3931214628,0.7552431302,2.145300632,1.2131365356,0,1.1591850929,0.8681309141,0.7273134161,0.6210303458,0.6893382353,0.6965607314,-0.116191251,0.0579810982,-0.057768406,-0.115717303,-0.115918509,-0.057875394,-2.629517735,-16.76781934,-21.82904412,-3.88913075,-0.290478127,1.5075085522,2.5418098842,-6.59588625,2.2604109311,-1.273258674,-1.902204319,-16.14678899,-21.13970588,-3.192570019,-0.406669378,1.5654896504,2.4840414777,-6.711603553,2.1444924218,-1.331134068 +050,3,7,48,147,Texas,Fannin County,33915,33912,33922,33884,33601,33509,33606,33501,33937,34570,35258,35554,35913,10,-38,-283,-92,97,-105,436,633,688,296,359,88,361,302,356,318,333,353,345,331,306,303,78,404,410,408,379,455,453,442,441,437,483,10,-43,-108,-52,-61,-122,-100,-97,-110,-131,-180,2,8,15,14,42,61,68,55,47,45,40,4,-2,-184,-47,121,-39,467,674,751,382,502,6,6,-169,-33,163,22,535,729,798,427,542,-6,-1,-6,-7,-5,-5,1,1,0,0,-3,3145,3145,3141,3046,3085,3060,3012,3055,3081,3034,2997,2996,10.648025249,8.9501370675,10.609447176,9.4762720703,9.9244490143,10.468875115,10.071963449,9.4804376468,8.6426029487,8.4794380623,11.916349586,12.150848337,12.159141708,11.29404753,13.560433338,13.434562116,12.903790853,12.631036261,12.342540812,13.516728,-1.268324337,-3.200711269,-1.549694531,-1.81777546,-3.635984324,-2.965687001,-2.831827404,-3.150598614,-3.699937864,-5.037289938,0.2359673185,0.4445432318,0.4172254508,1.2515831036,1.8179921618,2.0166671609,1.6056753324,1.3461648622,1.2709710219,1.119397764,-0.05899183,-5.453063644,-1.400685442,3.6057513224,-1.162322858,13.849758297,19.676821347,21.50999599,10.789131786,14.048441938,0.1769754889,-5.008520412,-0.983459991,4.857334426,0.6556693042,15.866425457,21.282496679,22.856160852,12.060102807,15.167839702 +050,3,7,48,149,Texas,Fayette County,24554,24542,24545,24734,24645,24705,24761,24923,24999,25110,25272,25308,25547,3,189,-89,60,56,162,76,111,162,36,239,53,247,226,240,241,263,247,223,252,233,242,38,292,280,345,322,324,299,323,348,297,323,15,-45,-54,-105,-81,-61,-52,-100,-96,-64,-81,0,2,1,20,18,10,17,18,12,13,14,-9,233,-31,147,124,211,114,195,246,89,307,-9,235,-30,167,142,221,131,213,258,102,321,-3,-1,-5,-2,-5,2,-3,-2,0,-2,-1,455,455,450,460,453,449,418,405,401,403,420,420,10.02455407,9.1536888151,9.726443769,9.7440666316,10.586909267,9.8954368815,8.9005966992,10.003572705,9.2131277185,9.5172549405,11.850889831,11.340853399,13.981762918,13.019043383,13.042428146,11.978686751,12.891895667,13.814457544,11.743772242,12.702782421,-1.826335762,-2.187164584,-4.255319149,-3.274976752,-2.455518879,-2.08324987,-3.991298968,-3.81088484,-2.530644524,-3.18552748,0.0811704783,0.0405030479,0.8105369807,0.7277726115,0.4025440786,0.6810624574,0.7184338143,0.476360605,0.5140371688,0.5505849966,9.4563607216,-1.255594483,5.9574468085,5.0135446569,8.493680058,4.5671247146,7.7830329881,9.765392402,3.5191775405,12.073542425,9.5375311999,-1.215091436,6.7679837893,5.7413172684,8.8962241365,5.248187172,8.5014668024,10.241753007,4.0332147094,12.624127421 +050,3,7,48,151,Texas,Fisher County,3974,3978,3959,3947,3837,3857,3873,3876,3874,3869,3798,3810,3784,-19,-12,-110,20,16,3,-2,-5,-71,12,-26,11,37,34,30,43,41,43,34,44,32,32,18,44,62,51,54,65,46,44,45,42,68,-7,-7,-28,-21,-11,-24,-3,-10,-1,-10,-36,0,1,1,1,10,8,6,4,3,5,4,-13,-7,-85,40,17,20,-5,2,-75,18,7,-13,-6,-84,41,27,28,1,6,-72,23,11,1,1,2,0,0,-1,0,-1,2,-1,-1,22,22,22,22,22,22,22,22,22,22,22,22,9.3599797622,8.7358684481,7.7982843774,11.125485123,10.582010582,11.096774194,8.782125791,11.477761836,8.4121976866,8.4277060838,11.130786744,15.930113052,13.257083442,13.971539457,16.77635824,11.870967742,11.365103965,11.73862006,11.041009464,17.908875428,-1.770806982,-7.194244604,-5.458799064,-2.846054334,-6.194347658,-0.774193548,-2.582978174,-0.260858224,-2.628811777,-9.481169344,0.252972426,0.2569373073,0.2599428126,2.5873221216,2.0647825526,1.5483870968,1.0331912695,0.7825746707,1.3144058885,1.0534632605,-1.770806982,-21.83967112,10.397712503,4.3984476067,5.1619563815,-1.290322581,0.5165956348,-19.56436677,4.7318611987,1.8435607058,-1.517834556,-21.58273381,10.657655316,6.9857697283,7.2267389341,0.2580645161,1.5497869043,-18.7817921,6.0462670873,2.8970239663 +050,3,7,48,153,Texas,Floyd County,6446,6446,6404,6371,6352,6248,5950,5845,5849,5832,5801,5754,5672,-42,-33,-19,-104,-298,-105,4,-17,-31,-47,-82,23,91,81,101,66,63,77,84,82,58,62,34,64,70,59,73,68,66,55,68,46,54,-11,27,11,42,-7,-5,11,29,14,12,8,1,9,12,11,7,2,0,0,0,0,0,-32,-71,-42,-158,-309,-103,-6,-46,-45,-58,-90,-31,-62,-30,-147,-302,-101,-6,-46,-45,-58,-90,0,2,0,1,11,1,-1,0,0,-1,0,35,35,32,32,35,37,35,35,34,33,34,34,14.246575342,12.732846027,16.031746032,10.821446139,10.682492582,13.169146571,14.38233028,14.097825153,10.03894418,10.852441799,10.019569472,11.003694097,9.3650793651,11.969175275,11.530309453,11.287839918,9.417001969,11.690879395,7.9619212462,9.4521267285,4.2270058708,1.7291519296,6.6666666667,-1.147729136,-0.847816872,1.881306653,4.9653283109,2.4069457578,2.0770229338,1.4003150709,1.4090019569,1.8863475595,1.746031746,1.1477291359,0.3391267486,0,0,0,0,0,-11.11545988,-6.602216458,-25.07936508,-50.66404329,-17.46502755,-1.026167265,-7.87603801,-7.736611364,-10.03894418,-15.75354455,-9.706457926,-4.715868899,-23.33333333,-49.51631415,-17.12590081,-1.026167265,-7.87603801,-7.736611364,-10.03894418,-15.75354455 +050,3,7,48,155,Texas,Foard County,1336,1336,1344,1359,1309,1285,1273,1223,1196,1197,1183,1156,1135,8,15,-50,-24,-12,-50,-27,1,-14,-27,-21,3,16,16,13,5,10,9,11,7,9,8,3,19,15,23,28,21,22,20,21,14,10,0,-3,1,-10,-23,-11,-13,-9,-14,-5,-2,0,0,1,1,0,0,0,0,0,0,0,7,18,-55,-14,10,-39,-15,11,-1,-22,-19,7,18,-54,-13,10,-39,-15,11,-1,-22,-19,1,0,3,-1,1,0,1,-1,1,0,0,30,30,37,30,31,31,29,32,31,34,37,37,11.838697743,11.994002999,10.023130301,3.9093041439,8.0128205128,7.4410913601,9.1934809862,5.8823529412,7.6955964087,6.9838498472,14.05845357,11.244377811,17.733230532,21.892103206,16.826923077,18.189334436,16.715419975,17.647058824,11.970927747,8.729812309,-2.219755827,0.7496251874,-7.710100231,-17.98279906,-8.814102564,-10.74824308,-7.521938989,-11.76470588,-4.275331338,-1.745962462,0,0.7496251874,0.7710100231,0,0,0,0,0,0,0,13.318534961,-41.22938531,-10.79414032,7.8186082877,-31.25,-12.40181893,9.1934809862,-0.840336134,-18.81145789,-16.58664339,13.318534961,-40.47976012,-10.0231303,7.8186082877,-31.25,-12.40181893,9.1934809862,-0.840336134,-18.81145789,-16.58664339 +050,3,7,48,157,Texas,Fort Bend County,585375,584632,590177,605979,624737,651770,683977,715260,744489,768258,789269,812737,839706,5545,15802,18758,27033,32207,31283,29229,23769,21011,23468,26969,1934,7734,7906,8143,9092,9654,9974,9788,9587,9334,9482,652,2330,2361,2569,2720,2946,3036,3188,3442,3899,4331,1282,5404,5545,5574,6372,6708,6938,6600,6145,5435,5151,691,3047,3492,4047,5479,6411,6353,6309,4599,4569,3526,3327,7317,9553,17008,19820,17946,15894,10868,10290,13505,18398,4018,10364,13045,21055,25299,24357,22247,17177,14889,18074,21924,245,34,168,404,536,218,44,-8,-23,-41,-106,5936,5936,5565,4944,5009,5059,5041,5156,5119,5187,5068,5055,12.93142366,12.847805668,12.758253578,13.613356422,13.798948999,13.665363018,12.940696627,12.310541005,11.652890189,11.476341393,3.8958129207,3.8367909412,4.0250464745,4.072627526,4.2108663507,4.1596192222,4.2148488809,4.419827072,4.8676471873,5.2419357279,9.0356107397,9.0110147264,8.7332071034,9.5407288955,9.5880826479,9.5057437957,8.7258477459,7.890713933,6.7852430016,6.2344056648,5.0946532058,5.6747454327,6.3407407872,8.2036493438,9.1635655718,8.7042361392,8.3411171862,5.9055156026,5.7040984865,4.2676207288,12.234190189,15.524296426,26.647719127,29.676278517,25.651122719,21.776346481,14.368562622,13.213254088,16.860111635,22.267636463,17.328843395,21.199041859,32.988459914,37.879927861,34.814688291,30.480582621,22.709679808,19.118769691,22.564210122,26.535257192 +050,3,7,48,159,Texas,Franklin County,10605,10598,10605,10561,10633,10612,10561,10600,10686,10801,10776,10749,10821,7,-44,72,-21,-51,39,86,115,-25,-27,72,26,114,101,103,100,111,123,107,101,151,134,24,107,112,110,105,127,114,114,132,137,144,2,7,-11,-7,-5,-16,9,-7,-31,14,-10,3,11,0,-1,-5,-2,8,2,1,3,2,2,-63,83,-11,-38,55,70,118,6,-43,82,5,-52,83,-12,-43,53,78,120,7,-40,84,0,1,0,-2,-3,2,-1,2,-1,-1,-2,114,114,116,99,96,93,94,94,94,82,56,56,10.771992819,9.5309993394,9.6963991527,9.4459925377,10.49099759,11.556891854,9.9595104016,9.361820457,14.030197445,12.424663885,10.110554663,10.56902897,10.355377736,9.9182921645,12.003213459,10.711265621,10.611067157,12.235250498,12.729384437,13.351877608,0.6614381555,-1.038029631,-0.658978583,-0.472299627,-1.512215869,0.8456262332,-0.651556755,-2.873430041,1.3008130081,-0.927213723,1.0394028158,0,-0.094139798,-0.472299627,-0.189026984,0.7516677628,0.1861590729,0.0926912917,0.2787456446,0.1854427446,-5.9529434,7.8324053978,-1.035537774,-3.589477164,5.1982420491,6.5770929249,10.983385303,0.5561477499,-3.995354239,7.6031525267,-4.913540584,7.8324053978,-1.129677571,-4.061776791,5.0092150655,7.3287606878,11.169544376,0.6488390416,-3.716608595,7.7885952712 +050,3,7,48,161,Texas,Freestone County,19816,19817,19802,19602,19484,19599,19678,19745,19658,19651,19786,19753,19874,-15,-200,-118,115,79,67,-87,-7,135,-33,121,53,231,217,245,195,218,201,221,203,240,230,62,203,232,217,236,219,201,188,239,210,223,-9,28,-15,28,-41,-1,0,33,-36,30,7,0,-2,2,5,21,19,29,20,16,20,17,-5,-226,-104,85,104,51,-115,-60,156,-83,98,-5,-228,-102,90,125,70,-86,-40,172,-63,115,-1,0,-1,-3,-5,-2,-1,0,-1,0,-1,1584,1584,1582,1582,1590,1595,1637,1629,1620,1612,1581,1577,11.724698,11.103720002,12.537420362,9.9294752654,11.059533775,10.202268863,11.244244321,10.294900728,12.139912491,11.608246902,10.303522485,11.871258251,11.10457232,12.01721109,11.110265581,10.202268863,9.5652395126,12.120597409,10.62242343,11.254952431,1.4211755152,-0.767538249,1.4328480413,-2.087735825,-0.050731806,0,1.6790048081,-1.825696681,1.5174890614,0.3532944709,-0.101512537,0.1023384332,0.2558657217,1.0693281055,0.9639043198,1.4719691394,1.0175786716,0.811420747,1.0116593743,0.858000858,-11.47091666,-5.321598526,4.3497172684,5.2957201416,2.5873221216,-5.837119001,-3.052736015,7.9113522834,-4.198386403,4.9461225932,-11.5724292,-5.219260093,4.60558299,6.3650482471,3.5512264414,-4.365149862,-2.035157343,8.7227730304,-3.186727029,5.8041234512 +050,3,7,48,163,Texas,Frio County,17217,17217,17255,17491,17924,18397,18930,19348,19547,19818,20121,20199,20379,38,236,433,473,533,418,199,271,303,78,180,52,260,235,253,261,282,243,239,255,249,255,11,108,140,131,134,148,143,128,136,170,163,41,152,95,122,127,134,100,111,119,79,92,8,30,90,153,173,286,282,256,213,227,177,-8,52,241,192,229,-1,-183,-97,-28,-228,-91,0,82,331,345,402,285,99,159,185,-1,86,-3,2,7,6,4,-1,0,1,-1,0,2,3271,3289,3299,3328,3342,3371,3369,3377,3387,3400,3397,3397,14.965751453,13.271212763,13.93133449,13.98451523,14.734312138,12.495179329,12.142766417,12.769473447,12.351190476,12.568386811,6.2165429114,7.906254412,7.2134577792,7.1797894286,7.7329014055,7.3531302224,6.5032389178,6.8103858384,8.4325396825,8.0339100005,8.749208542,5.364958351,6.7178767104,6.8047258017,7.001410732,5.1420491066,5.639527499,5.9590876086,3.9186507937,4.5344768101,1.7268174754,5.082592122,8.4248781697,9.2694296354,14.943309473,14.500578481,13.006477836,10.666266056,11.259920635,8.7239390803,2.9931502907,13.610052238,10.572396134,12.26993865,-0.052249334,-9.409949865,-4.928235742,-1.402138261,-11.30952381,-4.485189019,4.7199677661,18.69264436,18.997274304,21.539368286,14.891060139,5.0906286155,8.0782420932,9.2641277949,-0.049603175,4.2387500616 +050,3,7,48,165,Texas,Gaines County,17526,17526,17588,17907,18305,18798,19319,20204,20477,20575,20799,21540,21996,62,319,398,493,521,885,273,98,224,741,456,87,340,371,370,391,437,466,425,424,457,449,42,99,112,114,122,119,139,110,117,101,159,45,241,259,256,269,318,327,315,307,356,290,11,14,30,77,108,123,164,99,73,90,82,5,66,111,163,143,441,-218,-319,-156,297,83,16,80,141,240,251,564,-54,-220,-83,387,165,1,-2,-2,-3,1,3,0,3,0,-2,1,87,87,84,91,90,88,84,80,80,79,63,63,19.157627835,20.490445156,19.944478883,20.51578036,22.113705943,22.909957966,20.70544675,20.495963649,21.587661494,20.626607865,5.5782504578,6.1857947642,6.1450556559,6.4013432327,6.0218100853,6.8336569897,5.359056806,5.6557258181,4.7710149035,7.3042998897,13.579377377,14.304650392,13.799423227,14.114437128,16.091895858,16.076300976,15.346389944,14.840237831,16.816646591,13.322307975,0.7888434991,1.6569093118,4.1506077676,5.6667628617,6.2242238696,8.0627319879,4.8231511254,3.5287861942,4.251399419,3.7669974274,3.7188336385,6.1305644538,8.786351508,7.5032137891,22.316119728,-10.71753398,-15.54126474,-7.540967758,14.029618083,3.8129364204,4.5076771376,7.7874737656,12.936959276,13.169976651,28.540343597,-2.654801996,-10.71811361,-4.012181563,18.281017502,7.5799338479 +050,3,7,48,167,Texas,Galveston County,291309,291318,292492,295632,301099,306652,313451,321074,329038,334691,337639,341541,345089,1174,3140,5467,5553,6799,7623,7964,5653,2948,3902,3548,963,3880,3937,3862,4054,4121,4313,4091,3940,3936,3930,596,2207,2232,2378,2437,2705,2606,2813,2889,2990,3265,367,1673,1705,1484,1617,1416,1707,1278,1051,946,665,133,530,521,549,563,661,609,506,362,344,281,646,943,3166,3471,4536,5492,5631,3860,1539,2613,2598,779,1473,3687,4020,5099,6153,6240,4366,1901,2957,2879,28,-6,75,49,83,54,17,9,-4,-1,4,4297,4297,4251,4574,4780,4878,4885,4993,5166,5072,4853,4845,13.194496399,13.195225319,12.709152268,13.075247177,12.989243923,13.268482969,12.327320337,11.720434905,11.590447304,11.447213201,7.5052199876,7.4807576613,7.8255733022,7.859984551,8.5260628029,8.0170801339,8.4763510409,8.5939940208,8.8047351218,9.510216565,5.6892764111,5.714467658,4.8835789657,5.2152626257,4.4631811197,5.2514028352,3.8509692962,3.1264408847,2.7857121823,1.9369966357,1.8023410029,1.7461804398,1.8066609516,1.8158273706,2.0834482487,1.8735233314,1.5247186728,1.0768521411,1.0129862481,0.8184903077,3.2068067278,10.611146396,11.422441098,14.629827625,17.310586659,17.323168931,11.631253117,4.5781089643,7.6945728673,7.5673943754,5.0091477308,12.357326836,13.22910205,16.445654996,19.394034908,19.196692262,13.15597179,5.6549611054,8.7075591154,8.3858846832 +050,3,7,48,169,Texas,Garza County,6461,6461,6466,6556,6413,6364,6409,6384,6197,6480,6227,6238,6222,5,90,-143,-49,45,-25,-187,283,-253,11,-16,27,68,58,58,65,64,64,65,56,48,45,26,59,45,49,60,61,45,43,49,35,38,1,9,13,9,5,3,19,22,7,13,7,6,21,26,14,54,60,71,46,34,42,45,-1,59,-188,-73,-15,-89,-278,212,-298,-43,-68,5,80,-162,-59,39,-29,-207,258,-264,-1,-23,-1,1,6,1,1,1,1,3,4,-1,0,2109,2122,2108,2108,2129,2114,2114,1853,2081,1830,1855,1854,10.44386423,8.944405891,9.078813493,10.177718625,10.005471742,10.174072013,10.254792143,8.8140395058,7.7015643803,7.2231139647,9.0615880817,6.9396252602,7.6700320889,9.3948171925,9.5364652544,7.1536443844,6.7839394178,7.7122845676,5.6157240273,6.0995184591,1.3822761481,2.0047806307,1.4087814041,0.7829014327,0.4690064879,3.020427629,3.4708527254,1.1017549382,2.085840353,1.1235955056,3.2253110121,4.0095612615,2.1914377397,8.4553354733,9.3801297585,11.28686114,7.2572375168,5.3513811285,6.7388688327,7.2231139647,9.0615880817,-28.9922122,-11.4267825,-2.348704298,-13.91385914,-44.19362531,33.44639899,-46.90328166,-6.899318091,-10.91492777,12.286899094,-24.98265094,-9.23534476,6.1066311751,-4.533729383,-32.90676417,40.703636507,-41.55190053,-0.160449258,-3.691813804 +050,3,7,48,171,Texas,Gillespie County,24837,24828,24875,25041,25177,25364,25476,25913,26225,26520,26706,26927,26960,47,166,136,187,112,437,312,295,186,221,33,66,253,237,252,240,257,254,281,232,237,235,88,353,337,353,338,305,345,364,381,375,405,-22,-100,-100,-101,-98,-48,-91,-83,-149,-138,-170,5,32,54,42,41,21,58,28,17,31,26,64,235,184,243,171,460,347,352,320,327,178,69,267,238,285,212,481,405,380,337,358,204,0,-1,-2,3,-2,4,-2,-2,-2,1,-1,390,390,376,374,363,329,360,330,311,311,247,246,10.137030211,9.4388466287,9.9721018579,9.4413847364,10.002140536,9.7433733553,10.655038392,8.7175440574,8.8378423732,8.7219552026,14.143761519,13.421482337,13.968856968,13.296616837,11.870244605,13.234109479,13.802256138,14.316311577,13.983927806,15.031454711,-4.006731309,-3.982635708,-3.99675511,-3.855232101,-1.868104069,-3.490736123,-3.147217746,-5.59876752,-5.146085432,-6.309499508,1.2821540188,2.1506232825,1.6620169763,1.6129032258,0.8172955302,2.2248647819,1.0617120106,0.6387855559,1.1560046986,0.9649822777,9.4158185752,7.3280497033,9.615955363,6.7269866247,17.902663994,13.310828954,13.347236705,12.0241987,12.193985047,6.6064171321,10.697972594,9.4786729858,11.277972339,8.3398898505,18.719959524,15.535693736,14.408948716,12.662984256,13.349989745,7.5713994099 +050,3,7,48,173,Texas,Glasscock County,1226,1226,1232,1238,1280,1271,1326,1379,1365,1366,1397,1430,1439,6,6,42,-9,55,53,-14,1,31,33,9,5,11,16,11,17,17,14,18,14,21,25,2,8,1,12,5,9,4,5,7,11,14,3,3,15,-1,12,8,10,13,7,10,11,1,3,10,6,10,11,16,11,11,11,12,2,0,18,-16,33,34,-41,-23,14,12,-13,3,3,28,-10,43,45,-25,-12,25,23,-1,0,0,-1,2,0,0,1,0,-1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,8.9068825911,12.708498809,8.6240689926,13.092029265,12.569316081,10.204081633,13.181984621,10.133912414,14.856738592,17.427675148,6.4777327935,0.7942811755,9.4080752646,3.8505968425,6.6543438078,2.915451895,3.6616623947,5.066956207,7.7821011673,9.759498083,2.4291497976,11.914217633,-0.784006272,9.241432422,5.9149722736,7.2886297376,9.5203222263,5.066956207,7.0746374248,7.6681770652,2.4291497976,7.9428117554,4.7040376323,7.701193685,8.1330868762,11.66180758,8.0556572684,7.9623597539,7.7821011673,8.3652840711,0,14.29706116,-12.54410035,25.413939161,25.138632163,-29.88338192,-16.84364702,10.133912414,8.4895649098,-9.062391077,2.4291497976,22.239872915,-7.840062721,33.115132846,33.271719039,-18.22157434,-8.787989747,18.096272168,16.271666077,-0.697107006 +050,3,7,48,175,Texas,Goliad County,7210,7210,7219,7208,7329,7454,7509,7517,7516,7559,7583,7607,7626,9,-11,121,125,55,8,-1,43,24,24,19,20,66,52,74,56,78,79,88,69,67,72,29,68,76,59,91,88,88,94,77,74,73,-9,-2,-24,15,-35,-10,-9,-6,-8,-7,-1,0,0,-1,-1,-1,-1,1,0,-1,0,0,19,-9,143,108,92,19,9,48,34,31,19,19,-9,142,107,91,18,10,48,33,31,19,-1,0,3,3,-1,0,-2,1,-1,0,1,93,93,94,90,93,94,90,85,90,107,93,93,9.1495113329,7.1541583545,10.011499696,7.4851299873,10.382004525,10.510210869,11.674958541,9.1137234183,8.8215931534,9.4531609007,9.4267692521,10.456077595,7.9821416492,12.163336229,11.713030747,11.707576665,12.470978441,10.170387003,9.7432521396,9.5844548021,-0.277257919,-3.301919241,2.0293580464,-4.678206242,-1.331026221,-1.197365795,-0.7960199,-1.056663585,-0.921658986,-0.131293901,0,-0.137579968,-0.135290536,-0.133663035,-0.133102622,0.1330406439,0,-0.132082948,0,0,-1.247660636,19.673935475,14.611377934,12.296999265,2.5289498203,1.1973657953,6.368159204,4.4908202351,4.0816326531,2.4945841266,-1.247660636,19.536355507,14.476087398,12.163336229,2.3958471982,1.3304064392,6.368159204,4.358737287,4.0816326531,2.4945841266 +050,3,7,48,177,Texas,Gonzales County,19807,19811,19797,19753,19923,20135,20331,20492,20784,20743,20768,20899,20948,-14,-44,170,212,196,161,292,-41,25,131,49,55,278,280,278,294,329,327,283,284,277,276,70,211,169,182,226,179,227,207,224,182,216,-15,67,111,96,68,150,100,76,60,95,60,4,4,-8,-9,-9,-6,8,-9,-13,-8,-2,0,-116,69,124,135,18,185,-106,-21,43,-8,4,-112,61,115,126,12,193,-115,-34,35,-10,-3,1,-2,1,2,-1,-1,-2,-1,1,-1,311,311,304,311,311,314,313,312,312,312,313,313,14.058154235,14.114326041,13.879874182,14.530717145,16.118364647,15.844558581,13.62968671,13.683120137,13.295893633,13.190909743,10.670037927,8.5190039318,9.086824105,11.169871003,8.7695661759,10.999127822,9.9694174874,10.792320108,8.7359301126,10.323320668,3.3881163085,5.5953221091,4.7930500774,3.3608461424,7.3487984714,4.8454307588,3.6602692224,2.8908000289,4.5599635203,2.8675890745,0.2022756005,-0.403266458,-0.449348445,-0.444817872,-0.293951939,0.3876344607,-0.433452934,-0.626340006,-0.383996928,-0.095586302,-5.865992415,3.4781732029,6.1910230166,6.6722680769,0.8818558166,8.9640469038,-5.105112337,-1.01178001,2.0639834881,-0.38234521,-5.663716814,3.0749067446,5.7416745719,6.2274502051,0.5879038777,9.3516813645,-5.538565271,-1.638120016,1.6799865601,-0.477931512 +050,3,7,48,179,Texas,Gray County,22535,22537,22474,22663,22922,22994,23425,23262,22713,22089,22006,21849,21658,-63,189,259,72,431,-163,-549,-624,-83,-157,-191,87,306,341,341,329,352,301,307,258,250,243,44,247,261,259,287,268,264,286,270,234,251,43,59,80,82,42,84,37,21,-12,16,-8,1,5,17,3,0,25,16,-2,-4,-4,0,-113,125,161,-8,371,-274,-605,-649,-66,-168,-182,-112,130,178,-5,371,-249,-589,-651,-70,-172,-182,6,0,1,-5,18,2,3,6,-1,-1,-1,1610,1610,1626,1612,1606,2015,2028,2018,1794,1957,1953,1950,13.558721226,14.961061753,14.85321021,14.17522997,15.079144087,13.094072866,13.704745324,11.70200703,11.401208528,11.170616223,10.944457983,11.451135242,11.281470511,12.365626144,11.480711975,11.484502447,12.767287175,12.246286427,10.671531182,11.538373135,2.614263243,3.5099265109,3.5717396986,1.809603826,3.5984321117,1.6095704187,0.9374581492,-0.544279397,0.7296773458,-0.367756913,0.2215477325,0.7458593836,0.1306734036,0,1.070961938,0.6960304513,-0.089281728,-0.181426466,-0.182419336,0,5.5386933115,7.0637271032,-0.34846241,15.984833797,-11.73774284,-26.31865144,-28.9719209,-2.993536682,-7.661612131,-8.366469763,5.7602410439,7.8095864868,-0.217789006,15.984833797,-10.6667809,-25.62262099,-29.06120262,-3.174963148,-7.844031467,-8.366469763 +050,3,7,48,181,Texas,Grayson County,120877,120869,121029,121429,121866,122385,123628,125672,128309,131085,133780,136143,138318,160,400,437,519,1243,2044,2637,2776,2695,2363,2175,334,1550,1437,1531,1542,1563,1587,1544,1639,1631,1676,295,1356,1350,1397,1347,1403,1401,1391,1574,1465,1545,39,194,87,134,195,160,186,153,65,166,131,30,157,162,130,191,204,119,84,47,49,48,103,55,215,276,856,1670,2328,2532,2578,2153,2003,133,212,377,406,1047,1874,2447,2616,2625,2202,2051,-12,-6,-27,-21,1,10,4,7,5,-5,-7,2214,2214,2359,2260,2195,2194,2228,2267,2302,2320,2235,2234,12.785719589,11.812819828,12.536284396,12.535922898,12.539109507,12.496997807,11.904670116,12.376116135,12.084927924,12.213028445,11.185442427,11.097638669,11.43905245,10.95064082,11.255515443,11.032321315,10.724997494,11.885300059,10.854947522,11.258430159,1.6002771614,0.7151811587,1.0972319458,1.5852820786,1.2835940634,1.4646764915,1.1796726216,0.4908160761,1.2299804018,0.9545982854,1.2950696615,1.3317166403,1.0644787534,1.5527634718,1.6365824308,0.9370779704,0.6476634001,0.3548977781,0.3630665042,0.349776471,0.4536868241,1.767401714,2.2599702765,6.9589818424,13.397513037,18.332079959,19.522425345,19.46652068,15.952697621,14.595880653,1.7487564857,3.0991183543,3.3244490299,8.5117453143,15.034095467,19.269157929,20.170088745,19.821418458,16.315764125,14.945657124 +050,3,7,48,183,Texas,Gregg County,121730,121807,122044,122719,123154,123313,123225,123887,123493,122985,123362,124098,124229,237,675,435,159,-88,662,-394,-508,377,736,131,492,1887,1954,1865,1926,1938,1820,1656,1635,1641,1625,233,1282,1196,1264,1303,1279,1260,1310,1390,1298,1385,259,605,758,601,623,659,560,346,245,343,240,52,218,216,155,185,131,169,99,61,74,68,-62,-142,-528,-594,-900,-113,-1124,-954,76,316,-184,-10,76,-312,-439,-715,18,-955,-855,137,390,-116,-12,-6,-11,-3,4,-15,1,1,-5,3,7,4414,4414,4303,4293,4237,4221,4102,4050,4078,4072,3993,3995,15.418997152,15.894384499,15.133871877,15.624366223,15.685195377,14.714204867,13.437304749,13.27395909,13.262749535,13.087582099,10.475439507,9.7285997242,10.256951235,10.570378603,10.351581469,10.186757216,10.629751945,11.284894884,10.490584337,11.154646897,4.9435576456,6.1657847751,4.8769206425,5.0539876206,5.3336139079,4.5274476514,2.8075528039,1.9890642062,2.7721651984,1.9329352024,1.7813149863,1.7570046325,1.2577748745,1.5007828408,1.0602479847,1.3663190234,0.8033171318,0.4952363942,0.5980764568,0.547664974,-1.160306092,-4.294900213,-4.820117906,-7.301105712,-0.914565056,-9.087234215,-7.741055997,0.6170158354,2.5539481128,-1.481916988,0.6210088943,-2.53789558,-3.562343032,-5.800322871,0.1456829292,-7.720915191,-6.937738865,1.1122522296,3.1520245696,-0.934252014 +050,3,7,48,185,Texas,Grimes County,26604,26588,26624,26663,26686,26796,26998,27302,27479,27924,28280,28940,29614,36,39,23,110,202,304,177,445,356,660,674,92,297,281,316,343,320,338,333,308,311,319,94,297,235,280,291,307,273,269,296,236,258,-2,0,46,36,52,13,65,64,12,75,61,5,8,4,13,15,15,3,-4,-5,-5,-8,35,32,-27,62,139,275,110,383,350,592,625,40,40,-23,75,154,290,113,379,345,587,617,-2,-1,0,-1,-4,1,-1,2,-1,-2,-4,3012,3012,2970,3001,3018,2966,2914,2904,2912,2913,2944,2940,11.147184116,10.534405518,11.817059945,12.752351563,11.786372007,12.340044906,12.021009693,10.960074016,10.870325061,10.895925129,11.147184116,8.8099120883,10.47081261,10.819050452,11.307550645,9.9669593472,9.7106654874,10.533058145,8.2488640336,8.8123783175,0,1.7244934301,1.3462473356,1.9333011116,0.4788213628,2.3730855589,2.3103442052,0.4270158708,2.6214610276,2.0835468115,0.3002608516,0.1499559504,0.4861448712,0.557683013,0.5524861878,0.1095270258,-0.144396513,-0.177923279,-0.174764069,-0.273252041,1.2010434065,-1.012202665,2.3185370779,5.1678625869,10.128913444,4.0159909458,13.825966103,12.454629564,20.692065711,21.347815691,1.5013042581,-0.862246715,2.8046819491,5.7255455999,10.681399632,4.1255179716,13.68156959,12.276706284,20.517301643,21.074563651 +050,3,7,48,187,Texas,Guadalupe County,131533,131522,132581,135816,139657,142895,146832,150608,154510,159666,163397,166970,170608,1059,3235,3841,3238,3937,3776,3902,5156,3731,3573,3638,413,1644,1709,1737,1777,1782,1831,1811,1862,1837,1874,162,864,879,974,913,1052,1044,1063,1159,1202,1246,251,780,830,763,864,730,787,748,703,635,628,30,140,168,81,129,94,70,51,13,5,20,727,2302,2769,2352,2879,2924,3037,4339,3009,2939,3004,757,2442,2937,2433,3008,3018,3107,4390,3022,2944,3024,51,13,74,42,65,28,8,18,6,-6,-14,1888,1888,1889,1861,1879,1890,1918,1893,1916,1889,1871,1871,12.250509506,12.40774958,12.295081967,12.26672005,11.982248521,12.001914014,11.528569974,11.527163433,11.120965472,11.102619247,6.4382239742,6.3817506616,6.8943061808,6.3024847529,7.0736955352,6.8432540853,6.7669077205,7.1750711162,7.2767558503,7.381997642,5.8122855323,6.0259989182,5.4007757864,5.9642352974,4.9085529855,5.1586599283,4.761662253,4.3520923164,3.8442096214,3.7206216045,1.0432307366,1.219720263,0.5733457912,0.8904934645,0.6320602474,0.4588388755,0.32465879,0.0804796588,0.0302693671,0.1184911339,17.153693968,20.10360362,16.648262975,19.873881274,19.661108123,19.907052354,27.621460583,18.627945633,17.79233398,17.797368312,18.196924705,21.323323883,17.221608766,20.764374739,20.29316837,20.365891229,27.946119373,18.708425292,17.822603347,17.915859446 +050,3,7,48,189,Texas,Hale County,36273,36207,36271,36383,36248,35660,34435,34010,34062,33901,33501,33098,32754,64,112,-135,-588,-1225,-425,52,-161,-400,-403,-344,165,556,556,533,496,458,452,437,405,455,428,99,317,273,303,302,317,318,310,317,305,318,66,239,283,230,194,141,134,127,88,150,110,6,26,16,13,27,15,-1,-9,-23,-20,-10,-5,-153,-441,-848,-1489,-587,-80,-280,-466,-533,-443,1,-127,-425,-835,-1462,-572,-81,-289,-489,-553,-453,-3,0,7,17,43,6,-1,1,1,0,-1,2802,2807,2942,2891,2893,2806,2710,2751,2757,2680,2522,2522,15.305420211,15.310266966,14.82449797,14.152221984,13.383008255,13.280056411,12.859938496,12.017447553,13.663868827,12.998845897,8.7262917389,7.5174512261,8.4274350559,8.6168770954,9.262911827,9.3430485368,9.1226108324,9.4062490727,9.1592966861,9.6580210168,6.5791284719,7.7928157398,6.3970629137,5.5353448891,4.1200964278,3.937007874,3.7373276636,2.6111984808,4.5045721407,3.34082488,0.715721089,0.440583222,0.3615731212,0.7703830516,0.4383081306,-0.029380656,-0.264849992,-0.68247233,-0.600609619,-0.303711353,-4.211743331,-12.14357506,-23.58569283,-42.48519866,-17.15245818,-2.350452462,-8.239777526,-13.82748286,-16.00624634,-13.45441293,-3.496022242,-11.70299184,-23.22411971,-41.71481561,-16.71415005,-2.379833118,-8.504627518,-14.50995519,-16.60685596,-13.75812428 +050,3,7,48,191,Texas,Hall County,3353,3353,3359,3312,3269,3163,3072,3093,3112,3043,3038,2992,2939,6,-47,-43,-106,-91,21,19,-69,-5,-46,-53,6,38,39,21,37,26,23,21,22,29,26,5,39,62,58,45,60,39,57,34,33,32,1,-1,-23,-37,-8,-34,-16,-36,-12,-4,-6,3,4,-1,-1,1,1,1,1,1,0,1,3,-50,-20,-70,-86,57,33,-34,6,-42,-48,6,-46,-21,-71,-85,58,34,-33,7,-42,-47,-1,0,1,2,2,-3,1,0,0,0,0,44,44,43,45,44,42,43,44,43,44,42,42,11.392594813,11.852302082,6.5298507463,11.868484362,8.4347120843,7.4133763094,6.8237205524,7.2356520309,9.6185737977,8.7674928343,11.69239994,18.842121258,18.034825871,14.434643144,19.464720195,12.570507655,18.521527214,11.182371321,10.945273632,10.790760411,-0.299805127,-6.989819176,-11.50497512,-2.566158781,-11.03000811,-5.157131346,-11.69780666,-3.94671929,-1.326699834,-2.023267577,1.1992205067,-0.303905182,-0.310945274,0.3207698476,0.3244120032,0.3223207091,0.3249390739,0.3288932741,0,0.3372112629,-14.99025633,-6.078103632,-21.76616915,-27.5862069,18.491484185,10.6365834,-11.04792851,1.9733596448,-13.93034826,-16.18614062,-13.79103583,-6.382008813,-22.07711443,-27.26543705,18.815896188,10.95890411,-10.72298944,2.3022529189,-13.93034826,-15.84892935 +050,3,7,48,193,Texas,Hamilton County,8517,8515,8468,8393,8251,8244,8164,8084,8245,8413,8492,8465,8557,-47,-75,-142,-7,-80,-80,161,168,79,-27,92,21,99,82,103,76,84,94,99,83,85,80,54,144,117,125,148,145,141,134,141,113,121,-33,-45,-35,-22,-72,-61,-47,-35,-58,-28,-41,1,0,2,8,9,10,13,9,7,10,9,-15,-28,-111,9,-18,-28,194,195,131,-9,125,-14,-28,-109,17,-9,-18,207,204,138,1,134,0,-2,2,-2,1,-1,1,-1,-1,0,-1,254,254,254,242,237,229,225,230,215,215,178,178,11.743075737,9.8534006248,12.488632919,9.2637737689,10.339734121,11.51325862,11.886180814,9.8195800059,10.025358259,9.399600517,17.080837436,14.059120404,15.156107911,18.039980497,17.848350566,17.269887929,16.08836595,16.681455191,13.327829215,14.216895782,-5.337761699,-4.205719779,-2.667474992,-8.776206728,-7.508616445,-5.75662931,-4.202185136,-6.861875185,-3.302470956,-4.817295265,0,0.2403268445,0.9699909063,1.0970258411,1.2309207287,1.5922591708,1.0805618922,0.8281573499,1.1794539128,1.0574550582,-3.321273946,-13.33813987,1.0912397696,-2.194051682,-3.44657804,23.761406087,23.412174331,15.498373262,-1.061508522,14.686875808,-3.321273946,-13.09781303,2.061230676,-1.097025841,-2.215657312,25.353665258,24.492736223,16.326530612,0.1179453913,15.744330866 +050,3,7,48,195,Texas,Hansford County,5613,5613,5599,5580,5532,5543,5560,5652,5572,5470,5456,5380,5279,-14,-19,-48,11,17,92,-80,-102,-14,-76,-101,18,89,74,82,76,95,58,73,67,71,64,17,59,50,53,48,56,49,53,46,39,41,1,30,24,29,28,39,9,20,21,32,23,1,19,18,13,35,38,35,21,18,24,17,-17,-70,-92,-32,-45,16,-123,-144,-53,-132,-140,-16,-51,-74,-19,-10,54,-88,-123,-35,-108,-123,1,2,2,1,-1,-1,-1,1,0,0,-1,60,60,60,68,68,73,73,70,70,69,61,61,15.922712228,13.318934485,14.808126411,13.689993695,16.946129147,10.334996436,13.222242347,12.264323632,13.104466593,12.008631204,10.555505859,8.9992800576,9.5711060948,8.6463118076,9.9892971816,8.7312900927,9.5997101974,8.4202818964,7.1982281285,7.6930293649,5.3672063691,4.3196544276,5.237020316,5.0436818878,6.9568319658,1.6037063435,3.62253215,3.8440417353,5.9062384644,4.3156018388,3.3992307004,3.2397408207,2.3476297968,6.3046023597,6.7784516589,6.2366357805,3.8036587575,3.294892916,4.4296788483,3.1897926635,-12.52348153,-16.55867531,-5.778781038,-8.10591732,2.854084909,-21.91732003,-26.08223148,-9.701629141,-24.36323367,-26.26888076,-9.124250827,-13.31893449,-3.431151242,-1.80131496,9.632536568,-15.68068425,-22.27857272,-6.406736226,-19.93355482,-23.07908809 +050,3,7,48,197,Texas,Hardeman County,4139,4139,4159,4160,4098,4067,3992,3922,3981,3956,3914,3927,4011,20,1,-62,-31,-75,-70,59,-25,-42,13,84,14,46,30,42,45,44,44,28,38,38,38,10,28,45,39,71,57,47,50,47,33,44,4,18,-15,3,-26,-13,-3,-22,-9,5,-6,0,3,1,5,5,14,13,10,8,10,8,14,-20,-49,-39,-56,-73,51,-13,-40,-2,82,14,-17,-48,-34,-51,-59,64,-3,-32,8,90,2,0,1,0,2,2,-2,0,-1,0,0,21,21,21,21,21,21,21,21,21,21,21,21,11.059021517,7.2656817631,10.28781384,11.167638665,11.119535001,11.135012021,7.0555625551,9.6569250318,9.6926412447,9.5742000504,6.7315783147,10.898522645,9.5529699939,17.620052116,14.404852161,11.894217386,12.599218848,11.944091487,8.4172937125,11.085915848,4.3274432023,-3.632840882,0.7348438457,-6.452413451,-3.285317159,-0.759205365,-5.543656293,-2.287166455,1.2753475322,-1.511715797,0.7212405337,0.2421893921,1.2247397428,1.2408487405,3.538033864,3.2898899152,2.5198437697,2.0330368488,2.5506950644,2.0156210632,-4.808270225,-11.86728021,-9.552969994,-13.89750589,-18.44831943,12.906491206,-3.275796901,-10.16518424,-0.510139013,20.660115898,-4.087029691,-11.62509082,-8.328230251,-12.65665715,-14.91028557,16.196381121,-0.755953131,-8.132147395,2.0405560515,22.675736961 +050,3,7,48,199,Texas,Hardin County,54635,54635,54785,55074,55129,55311,55516,55767,56310,57194,57175,57796,58305,150,289,55,182,205,251,543,884,-19,621,509,177,660,684,692,729,687,725,665,715,652,671,103,509,542,553,587,546,593,570,654,556,614,74,151,142,139,142,141,132,95,61,96,57,2,-2,-2,5,10,10,37,32,22,28,23,76,142,-78,48,65,106,378,759,-100,499,428,78,140,-80,53,75,116,415,791,-78,527,451,-2,-2,-7,-10,-12,-6,-4,-2,-2,-2,1,380,380,378,374,391,387,391,407,412,422,402,404,12.01540156,12.413455169,12.531691416,13.155638969,12.346899347,12.937534017,11.717648717,12.503388156,11.341990589,11.558901301,9.2664233244,9.8363928387,10.014487505,10.593086522,9.8128195681,10.582010582,10.0436989,11.43666553,9.6720042445,10.576997614,2.7489782357,2.5770623304,2.5172039116,2.5625524466,2.5340797786,2.3555234348,1.6739498167,1.0667226259,1.6699863444,0.9819036873,-0.036410308,-0.036296653,0.0905469033,0.1804614399,0.1797219701,0.6602603567,0.5638567804,0.3847196356,0.4870793504,0.396206751,2.5851318508,-1.415569449,0.8692502716,1.1729993594,1.9050528832,6.7453625632,13.37397801,-1.748725616,8.6804498526,7.372890845,2.5487215431,-1.451866102,0.9597971749,1.3534607993,2.0847748533,7.40562292,13.93783479,-1.364005981,9.167529203,7.7690975961 +050,3,7,48,201,Texas,Harris County,4092459,4093109,4107542,4179279,4262549,4352419,4454951,4556559,4622836,4655798,4676913,4709243,4738253,14433,71737,83270,89870,102532,101608,66277,32962,21115,32330,29010,16102,66921,66375,67609,70224,72303,73570,70369,67758,66594,66344,5385,21867,22706,23933,24173,25089,25639,25966,27332,28267,31172,10717,45054,43669,43676,46051,47214,47931,44403,40426,38327,35172,4250,20546,24053,25597,34207,36830,35123,33789,25591,24967,19679,-142,6213,15706,20568,22245,17702,-16690,-45394,-45050,-31102,-26091,4108,26759,39759,46165,56452,54532,18433,-11605,-19459,-6135,-6412,-392,-76,-158,29,29,-138,-87,164,148,138,250,44554,44570,46022,46120,46753,48233,48458,48734,48580,48233,47069,47049,16.15118753,15.725267087,15.695705428,15.946644685,16.046811245,16.029378843,15.167965457,14.520539637,14.189834475,14.044779696,5.2775364642,5.3794036078,5.5561436792,5.4892663758,5.5682122086,5.5862069341,5.5969445502,5.8572476958,6.023125974,6.5989972369,10.873651066,10.345863479,10.139561749,10.457378309,10.478599036,10.443171908,9.5710209067,8.6632919416,8.1667085013,7.4457824592,4.9587169796,5.6985288021,5.9424480741,7.7678126387,8.1739908184,7.6525740531,7.2831841411,5.4841513897,5.3199627196,4.1659715971,1.4994893699,3.7209950262,4.7749451884,5.0514512278,3.9287533388,-3.636405231,-9.784629936,-9.654215158,-6.627207134,-5.523368308,6.4582063496,9.4195238283,10.717393263,12.819263867,12.102744157,4.0161688216,-2.501445795,-4.170063768,-1.307244414,-1.357396711 +050,3,7,48,203,Texas,Harrison County,65631,65639,65770,66350,66273,66287,66605,66710,66657,66516,66693,66484,66386,131,580,-77,14,318,105,-53,-141,177,-209,-98,207,873,861,825,883,814,854,803,763,687,709,100,623,550,665,618,647,683,667,701,686,755,107,250,311,160,265,167,171,136,62,1,-46,10,37,65,85,58,78,80,75,52,56,47,21,294,-463,-222,10,-137,-303,-353,66,-268,-102,31,331,-398,-137,68,-59,-223,-278,118,-212,-55,-7,-1,10,-9,-15,-3,-1,1,-3,2,3,1363,1363,1317,1073,1354,1388,1240,1216,1211,1228,1056,1054,13.215258856,12.984173183,12.447193724,13.288986545,12.211679106,12.806766292,12.059501551,11.455682424,10.317096796,10.672085497,9.4308204662,8.2941872827,10.033192517,9.3007856003,9.706334621,10.242413791,10.017045497,10.524814389,10.302079188,11.364491608,3.7844383893,4.6899858999,2.414001207,3.9882009451,2.5053444849,2.564352501,2.0424560534,0.9308680344,0.0150176081,-0.692406111,0.5600968816,0.9802221334,1.2824381412,0.8728892635,1.1701608971,1.1996970765,1.1263544412,0.7807280289,0.8409860562,0.707458418,4.4504995459,-6.982197658,-3.349426675,0.1504981489,-2.055282601,-4.543852677,-5.301374903,0.9909240367,-4.024718983,-1.53533529,5.0105964275,-6.001975525,-2.066988533,1.0233874123,-0.885121704,-3.344155601,-4.175020462,1.7716520656,-3.183732927,-0.827876872 +050,3,7,48,205,Texas,Hartley County,6062,6064,6067,6035,6092,6011,6059,5705,5733,5701,5556,5507,5443,3,-32,57,-81,48,-354,28,-32,-145,-49,-64,10,55,58,65,66,61,57,62,67,73,71,5,34,38,35,44,43,55,50,47,31,25,5,21,20,30,22,18,2,12,20,42,46,1,17,12,11,17,22,11,9,4,4,6,-4,-70,23,-126,9,-405,15,-54,-169,-95,-116,-3,-53,35,-115,26,-383,26,-45,-165,-91,-110,1,0,2,4,0,11,0,1,0,0,0,1406,1406,1428,1448,1429,1460,1058,1129,1124,1134,1125,1125,9.0894067096,9.565432506,10.741138561,10.936205468,10.370622237,9.9667774086,10.844848697,11.903704362,13.197143632,12.96803653,5.618905966,6.2670075039,5.7836899942,7.2908036454,7.3104386263,9.6170659206,8.7458457233,8.3503597761,5.6042664738,4.5662100457,3.4705007437,3.2984250021,4.9574485665,3.6454018227,3.060183611,0.349711488,2.0990029736,3.5533445856,7.5928771581,8.401826484,2.809452983,1.9790550012,1.817731141,2.8169014085,3.7402244135,1.9234131841,1.5742522302,0.7106689171,0.7231311579,1.095890411,-11.56833581,3.7931887524,-20.82128398,1.4913007457,-68.85413125,2.6228361602,-9.445513381,-30.02576175,-17.174365,-21.18721461,-8.758882829,5.7722437536,-19.00355284,4.3082021541,-65.11390683,4.5462493443,-7.871261151,-29.31509283,-16.45123384,-20.0913242 +050,3,7,48,207,Texas,Haskell County,5899,5902,5878,5956,5883,5899,5811,5819,5749,5696,5689,5665,5754,-24,78,-73,16,-88,8,-70,-53,-7,-24,89,15,37,51,45,48,59,49,43,42,34,37,34,78,92,92,91,84,73,83,82,52,58,-19,-41,-41,-47,-43,-25,-24,-40,-40,-18,-21,2,17,33,41,60,38,37,39,31,33,25,-8,102,-66,21,-107,-5,-83,-51,2,-39,86,-6,119,-33,62,-47,33,-46,-12,33,-6,111,1,0,1,1,2,0,0,-1,0,0,-1,544,544,544,534,519,511,509,523,525,525,531,531,6.2531688356,8.6155925332,7.6387710066,8.1981212639,10.146173689,8.4716459198,7.5141983399,7.3781291173,5.9890787388,6.4804273579,13.182355924,15.541853197,15.617042947,15.542271563,14.445399828,12.621023513,14.504150284,14.404918753,9.1597674828,10.15850775,-6.929187088,-6.926260664,-7.97827194,-7.344150299,-4.299226139,-4.149377593,-6.989951944,-7.026789635,-3.170688744,-3.678080392,2.8730775731,5.5747951685,6.9597691394,10.24765158,6.5348237317,6.3969571231,6.8152031455,5.4457619675,5.8129293641,4.3786671337,17.238465439,-11.14959034,3.5647598031,-18.27497865,-0.859845228,-14.34993084,-8.912188729,0.3513394818,-6.869825612,15.06261494,20.111543012,-5.574795169,10.524528942,-8.027327071,5.6749785039,-7.952973721,-2.096985583,5.7971014493,-1.056896248,19.441282074 +050,3,7,48,209,Texas,Hays County,157107,156978,158086,163161,168406,175933,184764,194588,204581,214863,222928,230400,241365,1108,5075,5245,7527,8831,9824,9993,10282,8065,7472,10965,498,2108,2018,2089,2244,2450,2484,2462,2654,2611,2642,238,845,769,867,886,886,1051,1112,1187,1196,1277,260,1263,1249,1222,1358,1564,1433,1350,1467,1415,1365,25,92,143,180,258,439,520,447,352,308,264,758,3690,3722,5937,6963,7687,7985,8421,6220,5753,9392,783,3782,3865,6117,7221,8126,8505,8868,6572,6061,9656,65,30,131,188,252,134,55,64,26,-4,-56,7017,7016,6992,7066,7607,7955,7883,7823,8013,7681,7473,7477,13.123857966,12.172502089,12.133391803,12.442576456,12.916763323,12.445856266,11.739350187,12.124506899,11.519253168,11.20049177,5.2607495167,4.6385798345,5.0357351331,4.9127106685,4.6711233894,5.2659399903,5.3022572739,5.4226788582,5.2765326651,5.4137123356,7.8631084493,7.533922254,7.0976566697,7.5298657876,8.2456399334,7.1799162761,6.4370929135,6.7018280412,6.2427205026,5.7867794347,0.5727679947,0.8625707625,1.0454813425,1.4305636032,2.3144731015,2.605412745,2.1313929869,1.6080732587,1.3588395158,1.1192012973,22.97297718,22.450967678,34.483459614,38.608582827,40.527003944,40.008116863,40.153155129,28.415385424,25.381180955,39.81643403,23.545745174,23.31353844,35.528940956,40.03914643,42.841477045,42.613529608,42.284548116,30.023458682,26.740020471,40.935635327 +050,3,7,48,211,Texas,Hemphill County,3807,3811,3800,3961,4098,4158,4171,4283,4104,3944,3850,3831,3777,-11,161,137,60,13,112,-179,-160,-94,-19,-54,16,72,67,66,61,81,54,52,45,43,43,12,33,36,37,35,25,41,47,31,23,32,4,39,31,29,26,56,13,5,14,20,11,4,10,13,5,5,6,10,6,4,6,5,-20,111,92,26,-19,49,-204,-171,-112,-46,-69,-16,121,105,31,-14,55,-194,-165,-108,-40,-64,1,1,1,0,1,1,2,0,0,1,-1,40,40,43,40,31,29,31,33,13,37,37,37,18.554310012,16.627373123,15.988372093,14.647616761,19.162526615,12.877071659,12.922465209,11.547344111,11.196458794,11.303890641,8.5040587553,8.9341109319,8.9631782946,8.4043702725,5.9143600662,9.7770358889,11.679920477,7.9548370541,5.9888035412,8.4121976866,10.050251256,7.6932621913,7.0251937984,6.2432464882,13.248166548,3.1000357696,1.2425447316,3.5925070567,5.2076552532,2.8916929548,2.5769875016,3.2262067254,1.2112403101,1.2006243246,1.4194464159,2.3846428997,1.4910536779,1.0264305876,1.562296576,1.3144058885,28.604561268,22.831616826,6.2984496124,-4.562372434,11.59214573,-48.64671515,-42.49502982,-28.74005645,-11.97760708,-18.13880126,31.181548769,26.057823551,7.5096899225,-3.361748109,13.011592146,-46.26207225,-41.00397614,-27.71362587,-10.41531051,-16.82439537 +050,3,7,48,213,Texas,Henderson County,78532,78567,78652,78829,78989,78679,79331,79509,80099,80976,82155,82822,83792,85,177,160,-310,652,178,590,877,1179,667,970,220,931,921,886,891,887,917,857,913,900,903,269,930,938,1046,1002,1078,1075,1080,1184,1085,1222,-49,1,-17,-160,-111,-191,-158,-223,-271,-185,-319,6,3,8,26,80,59,56,21,0,9,11,129,178,185,-159,677,316,692,1075,1448,845,1286,135,181,193,-133,757,375,748,1096,1448,854,1297,-1,-5,-16,-17,6,-6,0,4,2,-2,-8,1242,1242,1352,1342,1337,1268,1278,1297,1238,1255,1216,1216,11.823648567,11.671672433,11.238805591,11.27776723,11.168471418,11.490652098,10.641005743,11.193458018,10.910611782,10.839425258,11.810948622,11.887110469,13.268386737,12.682741599,13.573407202,13.470502732,13.409902219,14.515941176,13.153348649,14.668635289,0.0126999448,-0.215438036,-2.029581145,-1.404974369,-2.404935784,-1.979850634,-2.768896477,-3.322483158,-2.242736866,-3.82921003,0.0380998343,0.1013826053,0.3298069361,1.0125941396,0.7428859229,0.7017192121,0.2607480987,0,0.1091061178,0.1320417252,2.2605901664,2.3444727471,-2.016896263,8.5690779065,3.9788466381,8.6712445491,13.347819339,17.752603736,10.243852173,15.436878053,2.2986900007,2.4458553524,-1.687089327,9.5816720461,4.7217325611,9.3729637612,13.608567438,17.752603736,10.352958291,15.568919779 +050,3,7,48,215,Texas,Hidalgo County,774769,774734,779091,795305,807930,818047,829065,838741,847759,854739,860765,867221,875200,4357,16214,12625,10117,11018,9676,9018,6980,6026,6456,7979,3769,16375,16131,16311,16175,16332,15567,14673,14048,14070,14081,909,3564,3700,3845,4077,4151,4116,4297,4487,4657,5110,2860,12811,12431,12466,12098,12181,11451,10376,9561,9413,8971,263,2118,1834,1103,1425,1497,1714,253,-240,83,211,1208,1326,-1543,-3442,-2428,-3964,-4132,-3647,-3308,-3073,-1271,1471,3444,291,-2339,-1003,-2467,-2418,-3394,-3548,-2990,-1060,26,-41,-97,-10,-77,-38,-15,-2,13,33,68,6982,7005,7201,7183,7277,7329,7552,7361,7326,7406,7036,7029,20.801628053,20.123063681,20.063014421,19.640437323,19.585011686,18.460717462,17.237024654,16.377694252,16.28485416,16.162569207,4.5274505271,4.6156676969,4.7294641929,4.9504830273,4.9777971778,4.8811147347,5.0478767082,5.2311157537,5.390089966,5.8654022191,16.274177526,15.507395984,15.333550229,14.689954296,14.607214508,13.579602728,12.189147946,11.146578498,10.894764194,10.297166988,2.6905556162,2.2878742043,1.3567227581,1.7303012788,1.7951728199,2.0326119182,0.2972103345,-0.279801155,0.0960655931,0.242191755,1.6844554991,-1.924858177,-4.233762224,-2.94819053,-4.753550473,-4.900088942,-4.284292845,-3.856592582,-3.556741779,-1.458889671,4.3750111154,0.363016027,-2.877039466,-1.217889251,-2.958377653,-2.867477023,-3.987082511,-4.136393736,-3.460676186,-1.216697916 +050,3,7,48,217,Texas,Hill County,35089,35096,35153,35210,35165,34859,34778,34841,35101,35722,36178,36536,37006,57,57,-45,-306,-81,63,260,621,456,358,470,108,430,415,414,399,398,389,426,409,397,419,61,388,401,430,405,434,450,447,448,427,434,47,42,14,-16,-6,-36,-61,-21,-39,-30,-15,11,29,22,21,32,8,10,4,-2,-2,4,4,-11,-73,-317,-105,95,312,638,497,391,484,15,18,-51,-296,-73,103,322,642,495,389,488,-5,-3,-8,6,-2,-4,-1,0,0,-1,-3,829,829,788,789,786,756,760,759,752,737,652,652,12.22233276,11.793960924,11.824517308,11.459425306,11.433660351,11.123502331,12.029990257,11.376912378,10.919492807,11.394849202,11.028523514,11.396092362,12.281503485,11.631747491,12.467860785,12.867804753,12.623017946,12.461752434,11.744643397,11.802779364,1.1938092463,0.3978685613,-0.456986176,-0.172322185,-1.034200434,-1.744302422,-0.593027689,-1.084840056,-0.82515059,-0.407930162,0.8242968606,0.6252220249,0.5997943562,0.9190516536,0.2298223186,0.2859512167,0.112957655,-0.055632823,-0.055010039,0.1087813766,-0.312664326,-2.074600355,-9.054038615,-3.015638238,2.7291400336,8.9216779617,18.016745972,13.824756606,10.754462689,13.162546572,0.5116325341,-1.44937833,-8.454244259,-2.096586585,2.9589623522,9.2076291785,18.129703627,13.769123783,10.69945265,13.271327949 +050,3,7,48,219,Texas,Hockley County,22935,22898,22827,22907,23053,23387,23446,23291,23051,22974,22929,23055,22921,-71,80,146,334,59,-155,-240,-77,-45,126,-134,102,322,341,328,322,308,323,277,306,309,302,73,215,185,176,248,209,226,201,237,188,241,29,107,156,152,74,99,97,76,69,121,61,9,22,25,5,7,5,18,9,7,10,14,-115,-48,-30,176,-17,-259,-356,-162,-121,-5,-209,-106,-26,-5,181,-10,-254,-338,-153,-114,5,-195,6,-1,-5,1,-5,0,1,0,0,0,0,641,641,677,721,733,838,903,851,812,777,800,798,14.081427384,14.838990426,14.125753661,13.750987552,13.180135653,13.939838591,12.036936448,13.332461931,13.439457203,13.13728902,9.4021953033,8.0504786771,7.579672696,10.59082271,8.9436634786,9.7535712744,8.7343834872,10.326122476,8.1767571329,10.483730642,4.6792320812,6.7885117493,6.5460809647,3.160164841,4.2364721741,4.1862673169,3.3025529603,3.0063394549,5.2627000696,2.6535583783,0.9620851008,1.0879025239,0.2153316107,0.298934512,0.2139632411,0.7768331104,0.3910917979,0.3049909592,0.43493389,0.6090133983,-2.099094765,-1.305483029,7.579672696,-0.725983815,-11.08329589,-15.36403263,-7.039652363,-5.27198658,-0.217466945,-9.091700017,-1.137009665,-0.217580505,7.7950043066,-0.427049303,-10.86933265,-14.58719952,-6.648560565,-4.966995621,0.217466945,-8.482686619 +050,3,7,48,221,Texas,Hood County,51182,51161,51268,51564,52132,52872,53827,55246,56595,57994,60249,61762,63527,107,296,568,740,955,1419,1349,1399,2255,1513,1765,130,566,525,605,586,633,650,610,597,564,575,110,572,623,615,648,762,693,658,754,745,747,20,-6,-98,-10,-62,-129,-43,-48,-157,-181,-172,19,81,86,76,58,14,8,9,0,-2,1,70,224,568,671,933,1516,1379,1433,2405,1701,1949,89,305,654,747,991,1530,1387,1442,2405,1699,1950,-2,-3,12,3,26,18,5,5,7,-5,-13,701,701,699,674,702,685,706,654,691,678,674,673,11.00824646,10.125752199,11.523370538,10.984170423,11.606905467,11.623644281,10.646746197,10.097849344,9.2450680676,9.1787786637,11.124941652,12.015892609,11.713839473,12.146318147,13.972293785,12.392593056,11.484522947,12.753397664,12.212013671,11.924430716,-0.116695192,-1.89014041,-0.190468935,-1.162147724,-2.365388318,-0.768948775,-0.83777675,-2.65554832,-2.966945603,-2.745652052,1.5753850941,1.6586946459,1.4475639023,1.0871704515,0.2567088097,0.1430602373,0.1570831406,0,-0.032783929,0.0159630933,4.3566205072,10.955099522,12.780465506,17.488448814,27.797896821,24.660008405,25.011126722,40.678940825,27.882731885,31.112068897,5.9320056014,12.613794168,14.228029408,18.575619265,28.054605631,24.803068642,25.168209863,40.678940825,27.849947956,31.12803199 +050,3,7,48,223,Texas,Hopkins County,35161,35166,35211,35261,35309,35297,35686,35970,36163,36456,36690,37063,37170,45,50,48,-12,389,284,193,293,234,373,107,122,497,458,428,474,451,436,481,426,476,471,125,367,361,392,369,396,384,400,462,368,432,-3,130,97,36,105,55,52,81,-36,108,39,3,-2,-18,-16,1,-4,6,-5,-8,-5,-1,47,-77,-31,-31,283,235,137,219,278,271,69,50,-79,-49,-47,284,231,143,214,270,266,68,-2,-1,0,-1,0,-2,-2,-2,0,-1,0,431,431,431,441,430,436,431,427,443,432,413,413,14.104892723,12.980019838,12.123615557,13.355310426,12.587920063,12.088780447,13.247221801,11.647937003,12.907949507,12.68977409,10.415484164,10.230976336,11.103872192,10.396855585,11.05280786,10.646999293,11.016400666,12.632269707,9.9792550811,11.639028464,3.6894085594,2.7490435029,1.0197433646,2.9584548413,1.5351122027,1.4417811543,2.230821135,-0.984332704,2.928694426,1.0507456253,-0.056760132,-0.510131784,-0.453219273,0.0281757604,-0.111644524,0.166359364,-0.137705008,-0.218740601,-0.135587705,-0.026942196,-2.18526507,-0.878560295,-0.878112342,7.9737401913,6.5591157754,3.7985388103,6.0314793649,7.6012358844,7.348853606,1.8590114908,-2.242025201,-1.388692079,-1.331331615,8.0019159517,6.4474712515,3.9648981742,5.8937743566,7.3824952834,7.213265901,1.8320692953 +050,3,7,48,225,Texas,Houston County,23732,23731,23683,23433,23212,22806,22807,22743,22892,23073,23033,22877,22835,-48,-250,-221,-406,1,-64,149,181,-40,-156,-42,61,228,229,232,244,218,244,235,200,207,191,112,281,277,327,320,280,284,297,301,297,327,-51,-53,-48,-95,-76,-62,-40,-62,-101,-90,-136,5,11,15,11,20,15,9,7,4,7,-1,1,-208,-189,-325,58,-13,180,237,59,-74,97,6,-197,-174,-314,78,2,189,244,63,-67,96,-3,0,1,3,-1,-4,0,-1,-2,1,-2,2908,2908,2819,2801,2721,2772,2696,2713,2777,2726,2662,2661,9.6782409373,9.8188444635,10.083010996,10.698704317,9.5718990121,10.69354662,10.225171326,8.6756604347,9.017643215,8.3566678334,11.928007471,11.876942866,14.211830153,14.031087629,12.294182217,12.446587049,12.922876101,13.056868954,12.938357656,14.306965348,-2.249766534,-2.058098403,-4.128819158,-3.332383312,-2.722283205,-1.753040429,-2.697704775,-4.381208519,-3.920714441,-5.950297515,0.4669326768,0.6431557509,0.4780737972,0.8769429768,0.6586169045,0.3944340966,0.3045795714,0.1735132087,0.3049444565,-0.043752188,-8.829272434,-8.103762461,-14.12490764,2.5431346327,-0.570801317,7.8886819327,10.312194061,2.5593198282,-3.223698541,4.2439621981,-8.362339757,-7.46060671,-13.64683385,3.4200776095,0.0878155873,8.2831160294,10.616773632,2.7328330369,-2.918754084,4.2002100105 +050,3,7,48,227,Texas,Howard County,35012,35006,34983,34967,35485,36170,36513,37114,36202,35778,35813,36732,36540,-23,-16,518,685,343,601,-912,-424,35,919,-192,104,408,427,455,493,507,498,431,466,438,454,117,390,365,374,426,389,379,392,387,345,351,-13,18,62,81,67,118,119,39,79,93,103,22,90,64,46,97,117,119,91,67,86,73,-28,-123,384,543,178,364,-1157,-555,-112,742,-370,-6,-33,448,589,275,481,-1038,-464,-45,828,-297,-4,-1,8,15,1,2,7,1,1,-2,2,6080,6097,6062,6089,6077,6008,5945,5508,5737,5606,5829,5820,11.66547534,12.121728269,12.699741818,13.565758155,13.77212164,13.585029189,11.975548764,13.018396167,12.075263629,12.392182553,11.150822016,10.361664679,10.43890866,11.72213585,10.566775775,10.338807354,10.891914421,10.811414843,9.5113377903,9.5807402555,0.5146533238,1.7600635894,2.2608331589,1.8436223051,3.205345865,3.2462218343,1.0836343429,2.2069813245,2.5639258391,2.8114422972,2.573266619,1.8168398342,1.2839299421,2.6691248297,3.178181917,3.2462218343,2.5284801334,1.8717436549,2.3709421738,1.9925756087,-3.516797713,10.901039005,15.155955621,4.8979816463,9.887677075,-31.56200556,-15.42095026,-3.128884916,20.456268523,-10.09935582,-0.943531094,12.717878839,16.439885563,7.5671064761,13.065858992,-28.31578373,-12.89247013,-1.257141261,22.827210697,-8.106780216 +050,3,7,48,229,Texas,Hudspeth County,3476,3476,3472,3409,3353,3333,3300,3534,4259,4615,4782,4875,4906,-4,-63,-56,-20,-33,234,725,356,167,93,31,11,54,49,45,39,43,39,26,35,49,39,0,19,16,18,19,14,18,24,29,20,19,11,35,33,27,20,29,21,2,6,29,20,0,3,14,11,63,73,87,72,61,60,59,-14,-101,-105,-60,-119,129,613,280,98,2,-46,-14,-98,-91,-49,-56,202,700,352,159,62,13,-1,0,2,2,3,3,4,2,2,2,-2,86,86,86,86,86,86,86,86,86,86,86,86,15.695393111,14.492753623,13.460963207,11.759384894,12.584138133,10.00898242,5.8598151904,7.4491859104,10.148079114,7.9746447194,5.5224531318,4.7323277137,5.3843852827,5.7289311021,4.0971612526,4.6195303477,5.4090601758,6.1721826115,4.1420731076,3.8850833248,10.17293998,9.7604259095,8.076577924,6.0304537916,8.4869768803,5.3894520724,0.4507550146,1.2770032989,6.006006006,4.0895613945,0.871966284,4.1407867495,3.2904576727,18.995929444,21.363769388,22.327730014,16.227180527,12.982866872,12.426219323,12.064206114,-29.35619823,-31.05590062,-17.94795094,-35.88120006,37.752414399,157.3206724,63.105702051,20.857720549,0.4142073108,-9.405991207,-28.48423194,-26.91511387,-14.65749327,-16.88527062,59.116183787,179.64840241,79.332882578,33.840587422,12.840426634,2.6582149065 +050,3,7,48,231,Texas,Hunt County,86129,86144,86367,86688,86992,87447,88664,89708,91920,94058,96667,98559,99807,223,321,304,455,1217,1044,2212,2138,2609,1892,1248,285,1089,1052,1059,1075,1162,1119,1147,1207,1173,1187,243,821,815,853,900,921,959,967,956,1006,1093,42,268,237,206,175,241,160,180,251,167,94,28,95,98,72,127,127,111,104,64,67,59,146,-38,-9,189,901,678,1934,1847,2288,1661,1097,174,57,89,261,1028,805,2045,1951,2352,1728,1156,7,-4,-22,-12,14,-2,7,7,6,-3,-2,1869,1869,1934,1999,2252,2462,2499,2525,2759,2741,2660,2658,12.585594175,12.114233072,12.141780221,12.208209595,13.028950732,12.321888696,12.334792287,12.656966837,12.016842019,11.967776736,9.4883129641,9.3850760018,9.7799230677,10.220826638,10.326732895,10.560045808,10.399079461,10.024904968,10.306004323,11.020033675,3.0972812112,2.7291570705,2.3618571535,1.9873829573,2.7022178369,1.7618428877,1.9357128262,2.6320618692,1.7108376958,0.9477430608,1.0979168472,1.1285122064,0.8255034711,1.4422722033,1.4239903124,1.2222785033,1.1184118552,0.6711233451,0.6863839857,0.5948600063,-0.439166739,-0.103638876,2.1669466117,10.232183112,7.6020900141,21.296275905,19.862564389,23.992659588,17.016176124,11.060363167,0.6587501083,1.0248733303,2.9924500828,11.674455315,9.0260803265,22.518554408,20.980976245,24.663782934,17.70256011,11.655223173 +050,3,7,48,233,Texas,Hutchinson County,22150,22249,22211,22023,22024,21924,21917,21798,21540,21339,21068,20899,20677,-38,-188,1,-100,-7,-119,-258,-201,-271,-169,-222,62,285,313,301,315,285,305,308,237,253,235,49,237,224,261,231,272,258,224,259,203,229,13,48,89,40,84,13,47,84,-22,50,6,3,16,22,10,18,5,3,1,0,-2,-1,-57,-254,-110,-151,-106,-138,-308,-287,-251,-217,-225,-54,-238,-88,-141,-88,-133,-305,-286,-251,-219,-226,3,2,0,1,-3,1,0,1,2,0,-2,260,260,170,165,180,223,246,262,259,266,226,229,12.886015282,14.212091629,13.698006735,14.370110171,13.039002631,14.075407264,14.36600667,11.177399958,12.057092477,11.304598807,10.715739024,10.170953754,11.877673614,10.538080792,12.444241107,11.906410079,10.448004851,12.214964511,9.6742678771,11.015970752,2.1702762581,4.0411378755,1.820333121,3.8320293789,0.5947615235,2.1689971849,3.9180018191,-1.037564553,2.3828246003,0.2886280546,0.7234254194,0.998932958,0.4550832802,0.8211491526,0.2287544321,0.1384466288,0.0466428788,0,-0.095312984,-0.048104676,-11.48437853,-4.99466479,-6.871757532,-4.835656121,-6.313622326,-14.21385389,-13.38650622,-11.83766831,-10.34145877,-10.82355205,-10.76095311,-3.995731832,-6.416674251,-4.014506968,-6.084867894,-14.07540726,-13.33986334,-11.83766831,-10.43677175,-10.87165673 +050,3,7,48,235,Texas,Irion County,1599,1605,1615,1601,1582,1621,1586,1555,1575,1523,1541,1565,1564,10,-14,-19,39,-35,-31,20,-52,18,24,-1,5,12,22,10,19,12,15,19,13,12,14,4,22,9,13,16,15,13,11,13,13,10,1,-10,13,-3,3,-3,2,8,0,-1,4,0,0,0,0,0,0,0,0,0,0,0,9,-4,-32,41,-40,-28,19,-60,18,25,-4,9,-4,-32,41,-40,-28,19,-60,18,25,-4,0,0,0,1,2,0,-1,0,0,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,7.4626865672,13.823437009,6.244146113,11.849080137,7.6408787011,9.5846645367,12.26597805,8.4856396867,7.7269800386,8.9485458613,13.68159204,5.6550424128,8.1173899469,9.9781727471,9.5510983763,8.3067092652,7.1013557134,8.4856396867,8.3708950419,6.3918184724,-6.218905473,8.1683945963,-1.873243834,1.8709073901,-1.910219675,1.2779552716,5.164622337,0,-0.643915003,2.5567273889,0,0,0,0,0,0,0,0,0,0,-2.487562189,-20.10681747,25.600999063,-24.94543187,-17.82871697,12.14057508,-38.73466753,11.749347258,16.09787508,-2.556727389,-2.487562189,-20.10681747,25.600999063,-24.94543187,-17.82871697,12.14057508,-38.73466753,11.749347258,16.09787508,-2.556727389 +050,3,7,48,237,Texas,Jack County,9044,9041,9004,9031,8992,8950,8881,8886,8785,8829,8826,8945,9056,-37,27,-39,-42,-69,5,-101,44,-3,119,111,23,102,97,95,96,103,94,101,84,76,80,35,82,80,85,102,91,100,97,90,88,76,-12,20,17,10,-6,12,-6,4,-6,-12,4,2,13,1,0,-3,4,4,2,0,2,2,-27,-7,-57,-53,-59,-10,-100,39,4,130,107,-25,6,-56,-53,-62,-6,-96,41,4,132,109,0,1,0,1,-1,-1,1,-1,-1,-1,-2,1140,1140,1140,1143,1142,1134,1126,1126,1119,1122,1125,1126,11.311339063,10.764023747,10.589677851,10.767764007,11.594529183,10.638899892,11.468150335,9.5157179269,8.5532609307,8.8883950892,9.0934294428,8.8775453587,9.4749749192,11.440749257,10.243710249,11.317978609,11.013966163,10.195412065,9.9037758145,8.4439753347,2.2179096202,1.8864783887,1.1147029317,-0.67298525,1.350818934,-0.679078717,0.4541841717,-0.679694138,-1.350514884,0.4444197545,1.4416412531,0.110969317,0,-0.336492625,0.450272978,0.4527191444,0.2270920858,0,0.225085814,0.2222098772,-0.776268367,-6.325251068,-5.907925538,-6.617688296,-1.125682445,-11.31797861,4.4282956739,0.4531294251,14.630577908,11.888228432,0.6653728861,-6.214281751,-5.907925538,-6.954180921,-0.675409467,-10.86525946,4.6553877597,0.4531294251,14.855663722,12.110438309 +050,3,7,48,239,Texas,Jackson County,14075,14075,14091,14050,14271,14609,14723,14807,14871,14798,14826,14760,14854,16,-41,221,338,114,84,64,-73,28,-66,94,54,176,183,199,201,211,204,200,225,221,215,20,133,137,173,155,160,129,153,198,136,141,34,43,46,26,46,51,75,47,27,85,74,1,2,5,7,11,19,15,10,3,9,6,-17,-85,170,299,59,13,-26,-130,-2,-159,13,-16,-83,175,306,70,32,-11,-120,1,-150,19,-2,-1,0,6,-2,1,0,0,0,-1,1,217,217,217,219,221,221,219,229,233,237,222,222,12.508439643,12.923272483,13.781163435,13.705168417,14.290551981,13.747557113,13.482085679,15.190386173,14.939498411,14.520159384,9.4524004122,9.6747996187,11.980609418,10.568662212,10.836437521,8.6933081744,10.313795544,13.367539833,9.1935374839,9.522523131,3.056039231,3.2484728647,1.8005540166,3.1365062048,3.4541144599,5.0542489386,3.1682901345,1.8228463408,5.7459609275,4.9976362531,0.1421413596,0.3530948766,0.4847645429,0.7500340925,1.2868269556,1.0108497877,0.6741042839,0.2025384823,0.6083958629,0.4052137503,-6.041007782,12.005225804,20.706371191,4.0229101323,0.8804605486,-1.752139632,-8.763355691,-0.135025655,-10.74832691,0.8779631255,-5.898866423,12.358320681,21.191135734,4.7729442247,2.1672875042,-0.741289844,-8.089251407,0.0675128274,-10.13993105,1.2831768758 +050,3,7,48,241,Texas,Jasper County,35710,35710,35775,36201,35855,35615,35425,35268,35443,35580,35802,35610,35375,65,426,-346,-240,-190,-157,175,137,222,-192,-235,108,470,448,455,409,429,451,430,422,384,374,132,412,343,438,401,455,417,417,456,420,455,-24,58,105,17,8,-26,34,13,-34,-36,-81,6,38,44,-8,-5,-4,9,5,-1,1,0,82,331,-510,-249,-192,-122,135,119,259,-155,-154,88,369,-466,-257,-197,-126,144,124,258,-154,-154,1,-1,15,0,-1,-5,-3,0,-2,-2,0,941,941,942,921,950,940,945,952,939,876,930,931,13.059908859,12.434772954,12.732615083,11.51463964,12.136986689,12.756148265,12.108753502,11.823709058,10.754495043,10.537437487,11.448260531,9.5203730432,12.256891003,11.289414414,12.87256164,11.794487421,11.742674908,12.776330167,11.762728953,12.819609777,1.6116483272,2.9143999112,0.47572408,0.2252252252,-0.735574951,0.9616608448,0.3660785943,-0.952621109,-1.00823391,-2.28217229,1.0559075247,1.2212723437,-0.223870155,-0.140765766,-0.113165377,0.2545572825,0.1407994593,-0.028018268,0.0280064975,0,9.1975102812,-14.15565671,-6.967958584,-5.405405405,-3.451544,3.8183592369,3.3510271321,7.2567313889,-4.341007114,-4.338944848,10.253417806,-12.93438437,-7.191828739,-5.546171171,-3.564709377,4.0729165194,3.4918265914,7.228713121,-4.313000616,-4.338944848 +050,3,7,48,243,Texas,Jeff Davis County,2342,2342,2344,2282,2296,2231,2216,2197,2229,2257,2243,2275,2220,2,-62,14,-65,-15,-19,32,28,-14,32,-55,4,14,21,10,11,12,13,16,14,21,17,1,23,13,22,22,13,18,20,22,21,31,3,-9,8,-12,-11,-1,-5,-4,-8,0,-14,0,-2,1,3,2,6,6,3,4,4,3,-2,-52,6,-58,-7,-22,31,28,-10,28,-44,-2,-54,7,-55,-5,-16,37,31,-6,32,-41,1,1,-1,2,1,-2,0,1,0,0,0,88,88,88,88,88,88,88,87,87,87,87,87,6.0527453524,9.1743119266,4.4179368235,4.9471553857,5.4384772264,5.8743786715,7.1333036112,6.2222222222,9.2961487384,7.5639599555,9.943795936,5.6793359546,9.7194610117,9.8943107713,5.8916836619,8.1337550836,8.916629514,9.7777777778,9.2961487384,13.793103448,-3.891050584,3.494975972,-5.301524188,-4.947155386,-0.453206436,-2.259376412,-1.783325903,-3.555555556,0,-6.229143493,-0.864677907,0.4368719965,1.3253810471,0.8994827974,2.7192386132,2.7112516945,1.3374944271,1.7777777778,1.7706949978,1.3348164627,-22.48162559,2.621231979,-25.62403358,-3.148189791,-9.970541582,14.008133755,12.48328132,-4.444444444,12.394864985,-19.57730812,-23.3463035,3.0581039755,-24.29865253,-2.248706993,-7.251302969,16.71938545,13.820775747,-2.666666667,14.165559982,-18.24249166 +050,3,7,48,245,Texas,Jefferson County,252273,252277,252457,253500,251617,253091,252896,255115,255696,255889,252655,251315,250127,180,1043,-1883,1474,-195,2219,581,193,-3234,-1340,-1188,875,3433,3357,3553,3535,3705,3711,3523,3523,3392,3346,538,2342,2281,2436,2531,2507,2539,2531,2617,2448,2718,337,1091,1076,1117,1004,1198,1172,992,906,944,628,99,471,523,538,738,760,638,562,452,271,273,-246,-511,-3608,-140,-1949,289,-1224,-1362,-4615,-2557,-2094,-147,-40,-3085,398,-1211,1049,-586,-800,-4163,-2286,-1821,-10,-8,126,-41,12,-28,-5,1,23,2,5,15983,16012,16554,16022,16046,16139,16167,15985,16202,15214,15591,15585,13.57032317,13.291969979,14.079428105,13.972690998,14.586298328,14.529835888,13.772882317,13.855241631,13.461118717,13.345511545,9.2577037179,9.0315709034,9.6531063506,10.004209594,9.8698650226,9.9410545192,9.8947388997,10.292128115,9.71486398,10.840735319,4.3126194519,4.2603990759,4.4263217544,3.9684814037,4.7164333056,4.5887813692,3.878143417,3.5631135162,3.7462547374,2.5047762254,1.8618182968,2.0708073575,2.1319257868,2.9170709919,2.9920611955,2.4979884928,2.1970933471,1.7776239617,1.0754608409,1.0888597285,-2.0199345,-14.28579913,-0.554776227,-7.703755235,1.1377706388,-4.792379177,-5.324628361,-18.14985527,-10.14742941,-8.351913083,-0.158116204,-12.21499177,1.5771495597,-4.786684243,4.1298318344,-2.294390685,-3.127535014,-16.37223131,-9.07196857,-7.263053354 +050,3,7,48,247,Texas,Jim Hogg County,5300,5300,5289,5287,5275,5262,5328,5295,5245,5186,5160,5161,5184,-11,-2,-12,-13,66,-33,-50,-59,-26,1,23,18,88,100,82,111,82,87,73,71,45,49,22,52,49,44,70,52,54,43,62,47,61,-4,36,51,38,41,30,33,30,9,-2,-12,-2,5,0,14,24,24,13,13,12,12,9,-6,-43,-65,-66,2,-88,-96,-101,-48,-8,26,-8,-38,-65,-52,26,-64,-83,-88,-36,4,35,1,0,2,1,-1,1,0,-1,1,-1,0,16,16,16,17,16,19,16,16,16,19,17,17,16.641452345,18.935807612,15.564202335,20.963172805,15.438200132,16.508538899,13.996740485,13.725111154,8.7200852631,9.4731754471,9.8335854766,9.27854573,8.3515232039,13.220018886,9.7900781324,10.246679317,8.2446553542,11.985308332,9.1076446081,11.793136781,6.8078668684,9.6572618822,7.2126791307,7.7431539188,5.6481219994,6.2618595825,5.7520851309,1.7398028223,-0.387559345,-2.319961334,0.9455370651,0,2.6573028376,4.5325779037,4.5184975995,2.4667931689,2.4925702234,2.3197370965,2.3253560701,1.7399710005,-8.131618759,-12.30827495,-12.52728481,0.3777148253,-16.56782453,-18.21631879,-19.36535327,-9.278948386,-1.55023738,5.0265828903,-7.186081694,-12.30827495,-9.869981968,4.910292729,-12.04932693,-15.74952562,-16.87278305,-6.959211289,0.77511869,6.7665538908 +050,3,7,48,249,Texas,Jim Wells County,40838,40867,40914,41245,41673,41706,41525,41540,41206,40952,40799,40573,40452,47,331,428,33,-181,15,-334,-254,-153,-226,-121,163,657,595,675,694,673,634,567,514,528,514,116,385,384,431,398,409,389,378,402,410,409,47,272,211,244,296,264,245,189,112,118,105,2,8,22,23,50,59,72,65,45,45,44,1,52,197,-235,-532,-311,-652,-511,-310,-388,-270,3,60,219,-212,-482,-252,-580,-446,-265,-343,-226,-3,-1,-2,1,5,3,1,3,0,-1,0,357,357,349,358,350,354,341,333,354,357,358,358,15.993378693,14.351528016,16.191127262,16.676478716,16.204177451,15.324003577,13.802672899,12.574769728,12.977436956,12.687442147,9.3720712277,9.2621626185,10.338334593,9.563744278,9.847709625,9.4022671791,9.2017819324,9.8347420827,10.077176424,10.095649491,6.6213074648,5.0893653971,5.8527926696,7.1127344379,6.3564678264,5.9217363981,4.6008909662,2.7400276449,2.9002605319,2.5917926566,0.1947443372,0.5306447334,0.5516976697,1.2014754118,1.4205742491,1.7402653905,1.582316999,1.1009039645,1.1060315588,1.0860845418,1.2658381918,4.751682385,-5.636910973,-12.78369838,-7.48811172,-15.75906992,-12.43944595,-7.584005089,-9.536449884,-6.664609688,1.460582529,5.2823271184,-5.085213303,-11.58222297,-6.067537471,-14.01880453,-10.85712895,-6.483101124,-8.430418326,-5.578525147 +050,3,7,48,251,Texas,Johnson County,150934,150947,151251,152084,153406,154531,156735,159346,162816,167114,171294,175997,179575,304,833,1322,1125,2204,2611,3470,4298,4180,4703,3578,485,1918,1963,1941,1954,2107,2088,2098,2157,2124,2158,228,1284,1172,1269,1310,1331,1367,1396,1455,1482,1579,257,634,791,672,644,776,721,702,702,642,579,17,64,23,5,-10,26,80,53,39,11,8,42,140,541,474,1568,1803,2665,3537,3437,4062,3007,59,204,564,479,1558,1829,2745,3590,3476,4073,3015,-12,-5,-33,-26,2,6,4,6,2,-12,-16,2644,2645,2643,2647,2677,2696,2707,2697,2675,2601,2589,2588,12.646084362,12.8514845,12.606474701,12.555177886,13.332025652,12.962422632,12.717849241,12.747925581,12.231817122,12.138188609,8.4658875501,7.6729189171,8.2419455928,8.4172379894,8.4218918568,8.4864136677,8.4624011154,8.599087492,8.5346294606,8.8814642323,4.1801968121,5.1785655832,4.3645291082,4.1379398971,4.9101337948,4.4760089644,4.2554481254,4.1488380889,3.6971876611,3.2567243765,0.4219757034,0.1505777603,0.0324741749,-0.064253725,0.1645147921,0.4966445453,0.3212802716,0.2304910049,0.0633474521,0.0449979188,0.9230718513,3.5418507971,3.0785517817,10.074984097,11.408468083,16.544471415,21.440911709,20.312758564,23.392486416,16.913592746,1.3450475547,3.6924285574,3.1110259566,10.010730372,11.572982875,17.04111596,21.76219198,20.543249569,23.455833868,16.958590665 +050,3,7,48,253,Texas,Jones County,20202,20192,20237,20271,19873,20041,19851,19965,19968,19829,19833,19867,19875,45,34,-398,168,-190,114,3,-139,4,34,8,25,155,191,190,181,157,154,167,164,154,154,20,213,174,206,195,201,187,207,172,170,194,5,-58,17,-16,-14,-44,-33,-40,-8,-16,-40,4,13,10,12,7,0,6,4,2,4,2,35,76,-439,168,-185,157,31,-103,10,48,46,39,89,-429,180,-178,157,37,-99,12,52,48,1,3,14,4,2,1,-1,0,0,-2,0,5007,5025,5174,5095,5277,5270,5280,5250,5181,5251,5096,5090,7.6528093216,9.515743324,9.5204690084,9.0745011531,7.8862768736,7.7129191396,8.3925924065,8.2698804901,7.758186398,7.7499874189,10.516441197,8.6687923475,10.322192714,9.7763962699,10.096443641,9.3656875266,10.40279418,8.6732892945,8.564231738,9.762971164,-2.863631875,0.8469509765,-0.801723706,-0.701895117,-2.210166767,-1.652768387,-2.010201774,-0.403408804,-0.80604534,-2.012983745,0.6418485237,0.4982064568,0.6012927795,0.3509475584,0,0.3005033431,0.2010201774,0.1008522011,0.201511335,0.1006491873,3.7523452158,-21.87126345,8.4180989127,-9.275042615,7.8862768736,1.552600606,-5.176269568,0.5042610055,2.4181360202,2.3149313069,4.3941937395,-21.37305699,9.0193916921,-8.924095057,7.8862768736,1.8531039491,-4.975249391,0.6051132066,2.6196473552,2.4155804942 +050,3,7,48,255,Texas,Karnes County,14824,14828,14886,14955,14857,14729,14907,15407,15513,15590,15715,15356,15562,58,69,-98,-128,178,500,106,77,125,-359,206,35,135,165,162,190,174,193,174,167,141,144,11,157,159,186,138,147,128,123,164,150,160,24,-22,6,-24,52,27,65,51,3,-9,-16,6,16,4,15,82,103,124,122,106,113,89,28,74,-114,-126,48,360,-83,-96,17,-464,134,34,90,-110,-111,130,463,41,26,123,-351,223,0,1,6,7,-4,10,0,0,-1,1,-1,3336,3353,3349,2957,2635,2630,2974,2987,3019,3014,2666,2660,9.047954157,11.06936804,10.951125532,12.822243218,11.479844296,12.483829237,11.188631322,10.669222169,9.075987255,9.314962158,10.522435575,10.666845566,12.5735145,9.3129977055,9.6984891469,8.2794307891,7.9092048998,10.477559495,9.6553055904,10.349957953,-1.474481418,0.4025224742,-1.622388968,3.5092455122,1.7813551494,4.2043984476,3.2794264219,0.1916626737,-0.579318335,-1.034995795,1.0723501223,0.2683483161,1.0139931048,5.5338102308,6.7955400145,8.020698577,7.844902421,6.7720811372,7.2736635448,5.7571641115,4.9596193157,-7.647927009,-8.517542081,3.2393035497,23.751401992,-5.368693402,-6.173037971,1.0860884843,-29.86707863,8.6680897859,6.031969438,-7.379578693,-7.503548976,8.7731137805,30.546942007,2.6520051746,1.6718644504,7.8581696215,-22.59341508,14.425253897 +050,3,7,48,257,Texas,Kaufman County,103350,103352,103880,105212,106569,108269,110895,114083,118040,122753,128512,136459,143198,528,1332,1357,1700,2626,3188,3957,4713,5759,7947,6739,358,1391,1413,1476,1518,1534,1643,1603,1731,1870,1953,247,787,779,854,888,897,886,977,979,1127,1174,111,604,634,622,630,637,757,626,752,743,779,17,64,56,37,89,54,119,57,26,22,30,381,664,672,1038,1865,2473,3069,4011,4970,7207,5978,398,728,728,1075,1954,2527,3188,4068,4996,7229,6008,19,0,-5,3,42,24,12,19,11,-25,-48,1336,1336,1337,1350,1293,1298,1273,1292,1301,1268,1249,1251,13.305147973,13.343973255,13.74058593,13.852640032,13.63688894,14.15628783,13.314340533,13.778281894,14.11475218,13.967109709,7.5277868115,7.3566561684,7.950176412,8.1035206512,7.9741130244,7.6338837599,8.1148538371,7.7925695978,8.5065912873,8.395999385,5.7773611616,5.987317087,5.7904095179,5.7491193809,5.6627759159,6.5224040703,5.199486696,5.9857122958,5.6081608931,5.5711103244,0.6121707191,0.528848197,0.3444455823,0.8121771824,0.4800469379,1.0253184734,0.4734356896,0.2069528187,0.166055908,0.2145485362,6.3512712108,6.3461783635,9.6630949832,17.019218485,21.984371805,26.442877268,33.314921945,39.559827274,54.398405863,42.752371655,6.9634419299,6.8750265605,10.007540565,17.831395667,22.464418743,27.468195741,33.788357635,39.766780093,54.564461771,42.966920192 +050,3,7,48,259,Texas,Kendall County,33410,33385,33594,34424,35563,37151,38379,39959,41916,43985,45614,47418,48523,209,830,1139,1588,1228,1580,1957,2069,1629,1804,1105,86,313,343,320,347,358,366,391,378,406,396,90,310,299,346,349,352,366,372,394,401,484,-4,3,44,-26,-2,6,0,19,-16,5,-88,12,48,72,39,45,64,60,60,60,16,21,192,776,997,1539,1161,1491,1890,1981,1582,1792,1179,204,824,1069,1578,1206,1555,1950,2041,1642,1808,1200,9,3,26,36,24,19,7,9,3,-9,-7,519,519,542,561,554,543,521,542,549,527,510,510,9.2034461466,9.8018203381,8.8016062931,9.1884019595,9.1398810284,8.9404580153,9.1035028696,8.4375941696,8.7281795511,8.2550734305,9.1152342027,8.5444439682,9.5167368045,9.2413610486,8.9866986648,8.9404580153,8.6611331649,8.7947410127,8.6206896552,10.089534193,0.0882119439,1.2573763699,-0.715130511,-0.052959089,0.1531823636,0,0.4423697047,-0.357146843,0.1074898959,-1.834460762,1.4113911024,2.0575249689,1.072695767,1.1915795048,1.6339452118,1.465648855,1.3969569621,1.3393006618,0.343967667,0.4377690456,22.817489488,28.491005472,42.330225266,30.742751225,38.065817356,46.167938931,46.122862365,35.312894117,38.524378708,24.577604986,24.22888059,30.548530441,43.402921033,31.93433073,39.699762567,47.633587786,47.519819327,36.652194779,38.868346375,25.015374032 +050,3,7,48,261,Texas,Kenedy County,416,413,417,438,447,438,437,441,427,408,419,385,379,4,21,9,-9,-1,4,-14,-19,11,-34,-6,0,5,1,9,4,3,3,5,1,3,2,0,0,3,3,3,1,4,4,9,1,0,0,5,-2,6,1,2,-1,1,-8,2,2,0,7,7,8,11,10,1,1,1,1,1,4,9,3,-24,-14,-8,-15,-21,16,-35,-9,4,16,10,-16,-3,2,-14,-20,17,-34,-8,0,0,1,1,1,0,1,0,2,-2,0,0,0,0,0,0,0,0,0,0,0,0,0,11.695906433,2.2598870056,20.338983051,9.1428571429,6.8337129841,6.9124423963,11.976047904,2.4183796856,7.4626865672,5.2356020942,0,6.7796610169,6.7796610169,6.8571428571,2.277904328,9.2165898618,9.5808383234,21.76541717,2.4875621891,0,11.695906433,-4.519774011,13.559322034,2.2857142857,4.555808656,-2.304147465,2.3952095808,-19.34703748,4.9751243781,5.2356020942,16.374269006,15.81920904,18.079096045,25.142857143,22.77904328,2.3041474654,2.3952095808,2.4183796856,2.4875621891,2.6178010471,21.052631579,6.7796610169,-54.23728814,-32,-18.22323462,-34.56221198,-50.2994012,38.69407497,-87.06467662,-23.56020942,37.426900585,22.598870056,-36.15819209,-6.857142857,4.555808656,-32.25806452,-47.90419162,41.112454655,-84.57711443,-20.94240838 +050,3,7,48,263,Texas,Kent County,808,808,812,813,825,782,747,746,748,758,724,758,786,4,1,12,-43,-35,-1,2,10,-34,34,28,1,6,5,9,11,9,8,5,8,4,8,1,12,11,16,19,15,7,10,12,9,14,0,-6,-6,-7,-8,-6,1,-5,-4,-5,-6,0,0,0,0,0,0,0,0,0,0,0,5,6,18,-38,-27,4,1,15,-31,39,34,5,6,18,-38,-27,4,1,15,-31,39,34,-1,1,0,2,0,1,0,0,1,0,0,52,52,48,49,39,22,45,52,53,53,52,52,7.3846153846,6.105006105,11.200995644,14.388489209,12.056262559,10.709504685,6.6401062417,10.796221323,5.3981106613,10.362694301,14.769230769,13.431013431,19.912881145,24.852844997,20.093770931,9.3708165997,13.280212483,16.194331984,12.145748988,18.134715026,-7.384615385,-7.326007326,-8.711885501,-10.46435579,-8.037508372,1.3386880857,-6.640106242,-5.398110661,-6.747638327,-7.772020725,0,0,0,0,0,0,0,0,0,0,7.3846153846,21.978021978,-47.29309272,-35.31720078,5.3583389149,1.3386880857,19.920318725,-41.83535762,52.631578947,44.041450777,7.3846153846,21.978021978,-47.29309272,-35.31720078,5.3583389149,1.3386880857,19.920318725,-41.83535762,52.631578947,44.041450777 +050,3,7,48,265,Texas,Kerr County,49625,49643,49640,49635,49712,49781,50333,50869,51442,51883,52359,52422,52869,-3,-5,77,69,552,536,573,441,476,63,447,134,473,486,507,504,538,566,558,524,500,504,185,675,684,748,706,746,735,727,767,713,783,-51,-202,-198,-241,-202,-208,-169,-169,-243,-213,-279,14,26,5,-4,44,63,72,49,31,35,28,38,174,269,319,700,677,670,561,688,243,699,52,200,274,315,744,740,742,610,719,278,727,-4,-3,1,-5,10,4,0,0,0,-2,-1,1910,1910,1912,1964,1961,1941,1989,2006,1970,1987,1887,1891,9.5290858726,9.7838887938,10.191671776,10.068521885,10.632200945,11.064303936,10.800871038,10.053529288,9.5437149865,9.5734678178,13.598589776,13.769917562,15.036233705,14.103921529,14.742791644,14.367956525,14.072102589,14.715757564,13.609337571,14.873066074,-4.069503903,-3.986028768,-4.844561929,-4.035399644,-4.1105907,-3.303652589,-3.271231551,-4.662228277,-4.065622584,-5.299598256,0.5237975321,0.1006572921,-0.080407667,0.8789979423,1.2450346831,1.4074732922,0.9484635858,0.5947698624,0.6680600491,0.5318593232,3.5054142533,5.4153623159,6.412511433,13.984058174,13.37918223,13.097320914,10.858940237,13.200053721,4.6382454834,13.277488104,4.0292117854,5.516019608,6.3321037661,14.863056116,14.624216913,14.504794206,11.807403823,13.794823584,5.3063055325,13.809347428 +050,3,7,48,267,Texas,Kimble County,4607,4605,4600,4592,4522,4457,4460,4387,4405,4380,4332,4362,4396,-5,-8,-70,-65,3,-73,18,-25,-48,30,34,11,36,43,44,43,41,33,38,52,54,56,6,70,58,49,53,53,53,60,73,50,59,5,-34,-15,-5,-10,-12,-20,-22,-21,4,-3,0,0,-2,-2,0,0,0,0,0,0,0,-10,25,-55,-58,13,-61,40,-3,-25,25,37,-10,25,-57,-60,13,-61,40,-3,-25,25,37,0,1,2,0,0,0,-2,0,-2,1,0,43,43,45,49,44,46,43,44,41,34,16,16,7.8328981723,9.4360324775,9.8006459517,9.6444992711,9.2686786481,7.5068243858,8.6511098463,11.937557392,12.422360248,12.788307833,15.230635335,12.727671714,10.914355719,11.887406078,11.981462643,12.056414923,13.659647126,16.758494031,11.502185415,13.473395752,-7.397737163,-3.291639236,-1.113709767,-2.242906807,-2.712783995,-4.549590537,-5.008537279,-4.820936639,0.9201748332,-0.68508792,0,-0.438885232,-0.445483907,0,0,0,0,0,0,0,5.4395126197,-12.06934387,-12.9190333,2.9157788494,-13.78998531,9.0991810737,-0.682982356,-5.739210285,5.7510927076,8.4494176753,5.4395126197,-12.5082291,-13.36451721,2.9157788494,-13.78998531,9.0991810737,-0.682982356,-5.739210285,5.7510927076,8.4494176753 +050,3,7,48,269,Texas,King County,286,285,288,258,269,272,262,280,289,287,275,267,283,3,-30,11,3,-10,18,9,-2,-12,-8,16,1,4,2,2,1,2,2,1,3,3,2,0,0,2,2,2,1,1,2,3,0,0,1,4,0,0,-1,1,1,-1,0,3,2,0,0,0,0,0,0,0,0,0,0,0,2,-34,11,2,-8,18,9,-3,-11,-11,14,2,-34,11,2,-8,18,9,-3,-11,-11,14,0,0,0,1,-1,-1,-1,2,-1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,14.652014652,7.5901328273,7.393715342,3.7453183521,7.3800738007,7.0298769772,3.4722222222,10.676156584,11.070110701,7.2727272727,0,7.5901328273,7.393715342,7.4906367041,3.6900369004,3.5149384886,6.9444444444,10.676156584,0,0,14.652014652,0,0,-3.745318352,3.6900369004,3.5149384886,-3.472222222,0,11.070110701,7.2727272727,0,0,0,0,0,0,0,0,0,0,-124.5421245,41.74573055,7.393715342,-29.96254682,66.420664207,31.634446397,-10.41666667,-39.14590747,-40.5904059,50.909090909,-124.5421245,41.74573055,7.393715342,-29.96254682,66.420664207,31.634446397,-10.41666667,-39.14590747,-40.5904059,50.909090909 +050,3,7,48,271,Texas,Kinney County,3598,3598,3591,3613,3646,3640,3563,3599,3634,3709,3690,3668,3670,-7,22,33,-6,-77,36,35,75,-19,-22,2,6,33,35,33,30,38,36,33,40,41,37,22,29,28,37,36,55,23,35,45,39,41,-16,4,7,-4,-6,-17,13,-2,-5,2,-4,2,17,20,29,37,23,21,18,14,18,12,7,2,5,-31,-112,30,1,58,-27,-43,-7,9,19,25,-2,-75,53,22,76,-13,-25,5,0,-1,1,0,4,0,0,1,-1,1,1,332,332,332,333,334,332,332,337,338,337,334,334,9.1615769017,9.6432015429,9.0584682954,8.3298625573,10.611561016,9.9543757777,8.9881519815,10.812271929,11.144332699,10.084491687,8.0510827318,7.7145612343,10.156464452,9.9958350687,15.358838313,6.3597400802,9.5328884652,12.16380592,10.600706714,11.174707005,1.1104941699,1.9286403086,-1.097996157,-1.665972511,-4.747277297,3.5946356975,-0.544736484,-1.351533991,0.5436259853,-1.090215318,4.7196002221,5.5104008817,7.9604721383,10.273497154,6.422786931,5.8067192036,4.9026283535,3.784295175,4.8926338679,3.2706459526,0.555247085,1.3776002204,-8.509470217,-31.09815355,8.3775481709,0.2765104383,15.797358028,-7.298283552,-11.68795868,-1.907876806,5.2748473071,6.8880011021,-0.548998079,-20.82465639,14.800335102,6.0832296419,20.699986382,-3.513988377,-6.795324817,1.3627691469 +050,3,7,48,273,Texas,Kleberg County,32061,32061,32037,32034,32093,32012,31884,31406,31309,30756,30718,30502,30338,-24,-3,59,-81,-128,-478,-97,-553,-38,-216,-164,99,472,492,501,481,432,433,395,417,419,406,86,258,244,214,249,255,260,309,276,253,253,13,214,248,287,232,177,173,86,141,166,153,28,91,126,93,145,101,81,62,38,48,32,-65,-311,-313,-471,-518,-766,-353,-708,-217,-432,-349,-37,-220,-187,-378,-373,-665,-272,-646,-179,-384,-317,0,3,-2,10,13,10,2,7,0,2,0,1974,1974,1985,2123,2076,1934,1800,1707,1551,1591,1361,1362,14.733654852,15.344550657,15.630606037,15.055715538,13.651445726,13.808498764,12.728590993,13.56671113,13.688337145,13.346482577,8.0535655757,7.6098991065,6.6765462912,7.7939151121,8.0581450466,8.291477318,9.9573028277,8.9794059277,8.2652727867,8.3168967784,6.680089276,7.7346515508,8.9540597457,7.2618004257,5.5933006794,5.5170214462,2.7712881656,4.5873052022,5.4230643581,5.0295857988,2.8405987108,3.9297019976,2.9014897434,4.5386252661,3.1916574498,2.5831140875,1.9979054217,1.236295019,1.5681149951,1.0519395135,-9.707980209,-9.761878772,-14.6946416,-16.2138475,-24.20603571,-11.25727497,-22.81479094,-7.05989524,-14.11303496,-11.47271532,-6.867381499,-5.832176774,-11.79315186,-11.67522224,-21.01437826,-8.674160887,-20.81688552,-5.823600221,-12.54491996,-10.42077581 +050,3,7,48,275,Texas,Knox County,3719,3719,3723,3721,3729,3719,3797,3790,3729,3669,3651,3663,3683,4,-2,8,-10,78,-7,-61,-60,-18,12,20,10,44,55,47,61,55,41,35,40,52,47,22,51,53,58,57,54,57,63,50,36,37,-12,-7,2,-11,4,1,-16,-28,-10,16,10,0,4,2,3,5,5,5,5,5,5,4,16,0,4,-2,68,-13,-50,-37,-14,-7,6,16,4,6,1,73,-8,-45,-32,-9,-2,10,0,1,0,0,1,0,0,0,1,-2,0,104,104,95,86,104,107,104,103,99,104,104,104,11.82160129,14.765100671,12.620837809,16.232038318,14.498484249,10.905705546,9.4620167613,10.928961749,14.219305442,12.796079499,13.702310586,14.228187919,15.574650913,15.167642363,14.234875445,15.161590637,17.03163017,13.661202186,9.8441345365,10.073509393,-1.880709296,0.5369127517,-2.953813104,1.0643959553,0.2636088045,-4.255885091,-7.569613409,-2.732240437,4.3751709051,2.7225701062,1.0746910263,0.5369127517,0.8055853921,1.3304949441,1.3180440227,1.329964091,1.3517166802,1.3661202186,1.3672409078,1.0890280425,0,1.0738255034,-0.537056928,18.09473124,-3.426914459,-13.29964091,-10.00270343,-3.825136612,-1.914137271,1.6335420637,1.0746910263,1.610738255,0.268528464,19.425226184,-2.108870436,-11.96967682,-8.650986753,-2.459016393,-0.546896363,2.7225701062 +050,3,7,48,277,Texas,Lamar County,49793,49791,49822,49869,49673,49113,49435,49399,49555,49610,49672,49781,49905,31,47,-196,-560,322,-36,156,55,62,109,124,152,651,672,616,726,654,670,689,611,630,628,143,548,588,647,636,646,568,627,658,630,723,9,103,84,-31,90,8,102,62,-47,0,-95,4,-5,9,2,11,10,24,19,6,9,12,23,-49,-288,-540,227,-52,33,-23,105,100,207,27,-54,-279,-538,238,-42,57,-4,111,109,219,-5,-2,-1,9,-6,-2,-3,-3,-2,0,0,713,713,691,711,702,706,716,665,681,701,643,645,13.060356502,13.50183842,12.47140283,14.733936762,13.234312079,13.541645613,13.896031866,12.308374126,12.669301077,12.599562627,10.993971372,11.814108617,13.099022129,12.907415676,13.072424469,11.480081654,12.645590682,13.255172136,12.669301077,14.505547419,2.0663851301,1.6877298025,-0.627619298,1.8265210862,0.1618876095,2.061563959,1.2504411839,-0.94679801,0,-1.905984792,-0.100309958,0.1808281931,0.0404915676,0.2232414661,0.2023595119,0.4850738727,0.3831997176,0.120867831,0.1809900154,0.2407559738,-0.983037586,-5.78650218,-10.93272326,4.6068920729,-1.052269462,0.666976575,-0.463873342,2.115187043,2.0110001709,4.1530405473,-1.083347544,-5.605673987,-10.89223169,4.830133539,-0.84990995,1.1520504477,-0.080673625,2.236054874,2.1919901863,4.3937965211 +050,3,7,48,279,Texas,Lamb County,13977,13976,13995,14064,13870,13671,13491,13267,13205,13186,13087,12904,12710,19,69,-194,-199,-180,-224,-62,-19,-99,-183,-194,51,218,203,183,190,205,187,190,159,172,157,63,160,149,157,162,164,140,151,148,132,153,-12,58,54,26,28,41,47,39,11,40,4,4,13,0,6,9,6,15,10,1,5,5,29,-4,-254,-237,-220,-274,-122,-71,-111,-227,-204,33,9,-254,-231,-211,-268,-107,-61,-110,-222,-199,-2,2,6,6,3,3,-2,3,0,-1,1,184,184,188,193,187,188,187,181,185,179,179,179,15.538686339,14.534259326,13.289277804,13.990133274,15.322520368,14.128135388,14.398848092,12.103680585,13.235350698,12.258920903,11.404540433,10.66800315,11.40118369,11.928429423,12.258016294,10.57721366,11.443295063,11.266319035,10.157362164,11.946591708,4.1341459068,3.8662561753,1.8880941142,2.061703851,3.0645040735,3.5509217286,2.9555530294,0.8373615499,3.0779885345,0.312329195,0.9266189102,0,0.4357140264,0.6626905235,0.4484640108,1.1332728921,0.7578341101,0.0761237773,0.3847485668,0.3904114937,-0.285113511,-18.18572349,-17.21070404,-16.19910169,-20.47985649,-9.217286189,-5.380622182,-8.449739276,-17.46758493,-15.92878894,0.6415053993,-18.18572349,-16.77499001,-15.53641116,-20.03139248,-8.084013297,-4.622788072,-8.373615499,-17.08283637,-15.53837745 +050,3,7,48,281,Texas,Lampasas County,19677,19674,19759,19920,20050,20138,20106,20362,20532,20867,21144,21429,21789,85,161,130,88,-32,256,170,335,277,285,360,60,220,234,231,257,231,222,221,218,188,209,27,193,202,213,223,174,235,198,216,202,212,33,27,32,18,34,57,-13,23,2,-14,-3,10,43,48,39,22,13,10,9,2,4,4,40,92,50,35,-91,187,173,302,272,296,362,50,135,98,74,-69,200,183,311,274,300,366,2,-1,0,-4,3,-1,0,1,1,-1,-3,222,222,224,222,218,222,223,221,227,225,214,214,11.088989138,11.708781586,11.495968946,12.772090249,11.416427795,10.857338485,10.676586391,10.378234272,8.8318887558,9.6718959693,9.7280677436,10.107580686,10.600179158,11.082397376,8.5993871701,11.493128576,9.5654484408,10.283021114,9.4895825993,9.8107270119,1.3609213942,1.6012009007,0.895789788,1.6896928735,2.8170406247,-0.635790091,1.1111379502,0.0952131585,-0.657693844,-0.138831043,2.1673933315,2.401801351,1.940877874,1.0933306828,0.6424829495,0.4890693011,0.4347931109,0.0952131585,0.1879125267,0.1851080568,4.6372136395,2.5018764073,1.7418134767,-4.522413279,9.2418701196,8.4608989094,14.589724389,12.94898955,13.905526977,16.752279143,6.8046069709,4.9036777583,3.6826913507,-3.429082596,9.8843530691,8.9499682105,15.0245175,13.044202709,14.093439504,16.9373872 +050,3,7,48,283,Texas,La Salle County,6886,6886,6913,7000,7154,7442,7482,7635,7600,7537,7507,7546,7500,27,87,154,288,40,153,-35,-63,-30,39,-46,20,92,104,90,104,108,96,80,96,84,92,3,64,55,55,59,55,61,65,52,43,40,17,28,49,35,45,53,35,15,44,41,52,0,15,17,28,28,24,28,27,22,24,18,8,45,85,217,-32,75,-99,-106,-97,-25,-117,8,60,102,245,-4,99,-71,-79,-75,-1,-99,2,-1,3,8,-1,1,1,1,1,-1,1,1583,1594,1592,1606,1642,1637,1638,1639,1637,1634,1637,1634,13.225041328,14.69549244,12.332145793,13.93728223,14.288549315,12.602559895,10.570126181,12.762563148,11.160566,12.229163897,9.2000287501,7.7716546559,7.5363113182,7.9067274189,7.2765760402,8.0078765999,8.588227522,6.9130550386,5.713146881,5.3170277815,4.0250125782,6.9238377844,4.7958344752,6.030554811,7.0119732751,4.594683295,1.9818986589,5.8495081095,5.4474191191,6.9121361159,2.1562567383,2.4021478027,3.8366675802,3.7523452158,3.1752331812,3.675746636,3.567417586,2.9247540548,3.1887331429,2.3926625017,6.4687702149,12.010739014,29.734173746,-4.288394532,9.9226036912,-12.99638989,-14.00541719,-12.89550651,-3.321597024,-15.55230626,8.6250269532,14.412886816,33.570841326,-0.536049317,13.097836872,-9.320643256,-10.4379996,-9.970752459,-0.132863881,-13.15964376 +050,3,7,48,285,Texas,Lavaca County,19263,19275,19266,19317,19532,19630,19777,19920,19886,20015,20086,20156,20216,-9,51,215,98,147,143,-34,129,71,70,60,45,198,223,232,215,237,232,228,229,223,222,51,191,250,246,283,267,272,257,274,236,259,-6,7,-27,-14,-68,-30,-40,-29,-45,-13,-37,3,7,-3,4,6,15,11,7,5,6,9,-3,38,243,108,208,160,-4,153,113,76,89,0,45,240,112,214,175,7,160,118,82,98,-3,-1,2,0,1,-2,-1,-2,-2,1,-1,409,409,413,407,410,412,415,415,415,407,420,420,10.26358759,11.480346984,11.848220213,10.911766945,11.9404489,11.656534191,11.428285005,11.421161567,11.082948164,10.997721193,9.9007334837,12.870344153,12.563199019,14.362930444,13.451898128,13.666281465,12.88188266,13.665494626,11.729039312,12.830674725,0.3628541067,-1.389997169,-0.714978806,-3.451163499,-1.511449228,-2.009747274,-1.453597654,-2.244333059,-0.646091149,-1.832953532,0.3628541067,-0.15444413,0.2042796589,0.3045144264,0.755724614,0.5526805004,0.3508683993,0.2493703399,0.2981959147,0.4458535619,1.9697794365,12.509974517,5.515550789,10.556500114,8.0610625488,-0.200974727,7.6689807273,5.6357696816,3.7771482531,4.4089963341,2.3326335433,12.355530387,5.7198304479,10.861014541,8.8167871628,0.351705773,8.0198491266,5.8851400214,4.0753441678,4.854849896 +050,3,7,48,287,Texas,Lee County,16612,16609,16594,16555,16504,16542,16614,16859,16961,17104,17113,17295,17397,-15,-39,-51,38,72,245,102,143,9,182,102,52,196,181,207,188,221,204,199,218,220,228,53,163,135,147,178,159,198,187,191,171,162,-1,33,46,60,10,62,6,12,27,49,66,0,-9,-8,-4,-4,-5,-2,-5,-6,-4,-6,-13,-63,-88,-15,67,188,99,137,-12,138,42,-13,-72,-96,-19,63,183,97,132,-18,134,36,-1,0,-1,-3,-1,0,-1,-1,0,-1,0,525,525,520,523,508,487,489,480,494,489,472,470,11.825394431,10.950119483,12.527991285,11.340330559,13.204672423,12.063867534,11.683546162,12.742204168,12.787723785,13.144240747,9.8343841443,8.1672161892,8.8966894632,10.737121486,9.5001941864,11.709047901,10.979010715,11.164041266,9.9395489421,9.3393289519,1.9910102869,2.7829032941,3.6313018217,0.6032090723,3.7044782362,0.3548196334,0.7045354469,1.5781629015,2.8481748431,3.8049117952,-0.543002806,-0.483983182,-0.242086788,-0.241283629,-0.298748245,-0.118273211,-0.293556436,-0.350702867,-0.232504069,-0.345901072,-3.801019639,-5.323814997,-0.907825455,4.0415007842,11.232934007,5.8545239503,8.0434463526,-0.701405734,8.0213903743,2.4213075061,-4.344022444,-5.807798179,-1.149912244,3.8002171553,10.934185762,5.7362507392,7.7498899163,-1.052108601,7.7888863055,2.0754064338 +050,3,7,48,289,Texas,Leon County,16801,16799,16724,16829,16740,16619,16731,17030,17200,17224,17289,17421,17493,-75,105,-89,-121,112,299,170,24,65,132,72,42,203,223,202,207,213,214,200,207,186,192,85,199,197,235,216,221,207,218,215,219,240,-43,4,26,-33,-9,-8,7,-18,-8,-33,-48,1,0,2,2,3,5,3,1,0,1,2,-33,102,-113,-90,117,300,160,43,73,166,120,-32,102,-111,-88,120,305,163,44,73,167,122,0,-1,-4,0,1,2,0,-2,0,-2,-2,104,104,108,104,105,104,107,104,104,107,107,107,12.100259291,13.286067503,12.11067478,12.413793103,12.618109653,12.503651767,11.619800139,11.995479964,10.717372515,10.998453342,11.861830537,11.737019274,14.089151353,12.953523238,13.092029265,12.094653812,12.665582152,12.459073393,12.618841832,13.748066678,0.2384287545,1.549048229,-1.978476573,-0.539730135,-0.473919611,0.408997955,-1.045782013,-0.463593429,-1.901469317,-2.749613336,0,0.1191575561,0.1199076711,0.179910045,0.2961997571,0.1752848379,0.0580990007,0,0.0576202823,0.1145672223,6.0799332399,-6.732401918,-5.395845199,7.0164917541,17.771985427,9.3485246859,2.49825703,4.2302900356,9.5649668683,6.8740333391,6.0799332399,-6.613244362,-5.275937528,7.1964017991,18.068185184,9.5238095238,2.5563560307,4.2302900356,9.6225871507,6.9886005614 +050,3,7,48,291,Texas,Liberty County,75643,75657,75870,76005,76378,76847,78047,79537,81381,83648,85834,88453,91547,213,135,373,469,1200,1490,1844,2267,2186,2619,3094,249,1034,1028,1076,1105,1078,1113,1090,1189,1307,1314,172,711,637,776,761,763,780,838,914,810,858,77,323,391,300,344,315,333,252,275,497,456,11,30,39,41,68,30,63,20,6,15,10,126,-217,-52,137,785,1137,1446,1992,1910,2117,2652,137,-187,-13,178,853,1167,1509,2012,1916,2132,2662,-1,-1,-5,-9,3,8,2,3,-5,-10,-24,5144,5144,5151,5015,4939,4984,5087,4973,5098,4876,4843,4845,13.616460905,13.492318697,14.044705498,14.267821865,13.68159204,13.833132403,13.20979949,14.030988542,14.998250013,14.6,9.362962963,8.3605126556,10.128895415,9.8260746059,9.683724236,9.6943785033,10.1557908,10.785806162,9.2950133974,9.5333333333,4.2534979424,5.1318060414,3.9158100832,4.4417472594,3.9978678038,4.1387538995,3.0540086894,3.2451823792,5.7032366155,5.0666666667,0.3950617284,0.5118681218,0.5351607114,0.8780198071,0.3807493147,0.7830074945,0.242381642,0.0708039792,0.1721298777,0.1111111111,-2.857613169,-0.682490829,1.788219938,10.13596395,14.430399025,17.971886302,24.141211545,22.539266707,24.29326341,29.466666667,-2.46255144,-0.170622707,2.3233806494,11.013983757,14.81114834,18.754893797,24.383593187,22.610070686,24.465393288,29.577777778 +050,3,7,48,293,Texas,Limestone County,23384,23388,23490,23587,23679,23433,23521,23433,23466,23376,23251,23389,23340,102,97,92,-246,88,-88,33,-90,-125,138,-49,84,280,320,298,313,319,318,277,249,263,244,33,278,250,280,256,281,265,260,301,259,298,51,2,70,18,57,38,53,17,-52,4,-54,18,43,46,23,30,13,15,8,1,3,6,34,52,-17,-292,6,-138,-33,-114,-72,131,-1,52,95,29,-269,36,-125,-18,-106,-71,134,5,-1,0,-7,5,-5,-1,-2,-1,-2,0,0,1592,1592,1590,1592,1590,1590,1593,1604,1595,1579,1571,1571,11.8954054,13.54038844,12.650704704,13.33219747,13.58776675,13.561056739,11.82699287,10.680507002,11.27787307,10.443193734,11.810438218,10.578428469,11.886568178,10.904289304,11.969161307,11.300880616,11.101148542,12.910974328,11.106346484,12.754392347,0.0849671814,2.9619599712,0.7641365257,2.4279081654,1.6186054436,2.2601761232,0.7258443277,-2.230467326,0.1715265866,-2.311198613,1.8267944007,1.9464308382,0.9763966718,1.2778464029,0.5537334412,0.6396724877,0.3415738013,0.0428936024,0.12864494,0.2567998459,2.2091467171,-0.719333136,-12.39599253,0.2555692806,-5.878093453,-1.407279473,-4.867426668,-3.088339374,5.6174957118,-0.042799974,4.0359411177,1.2270977024,-11.41959586,1.5334156834,-5.324360012,-0.767606985,-4.525852867,-3.045445772,5.7461406518,0.2139998716 +050,3,7,48,295,Texas,Lipscomb County,3302,3302,3283,3334,3448,3489,3551,3557,3502,3361,3315,3214,3111,-19,51,114,41,62,6,-55,-141,-46,-101,-103,14,59,35,44,48,43,58,36,40,32,36,10,25,31,32,30,22,29,25,34,27,43,4,34,4,12,18,21,29,11,6,5,-7,1,12,6,5,6,5,7,7,7,8,5,-24,5,103,22,39,-20,-93,-160,-58,-113,-100,-23,17,109,27,45,-15,-86,-153,-51,-105,-95,0,0,1,2,-1,0,2,1,-1,-1,-1,37,37,37,36,35,38,40,36,39,38,34,34,17.832854768,10.321439104,12.685598962,13.636363636,12.099043331,16.43292251,10.491038904,11.983223487,9.8024199724,11.383399209,7.5562943932,9.1418460631,9.2258901542,8.5227272727,6.1902082161,8.2164612551,7.2854436835,10.185739964,8.2707918517,13.596837945,10.276560375,1.1795930404,3.4597088078,5.1136363636,5.9088351154,8.2164612551,3.2055952207,1.7974835231,1.5316281207,-2.213438735,3.6270213088,1.7693895606,1.4415453366,1.7045454545,1.4068655037,1.9832837512,2.0399242314,2.0970641102,2.4506049931,1.581027668,1.5112588786,30.37452079,6.342799481,11.079545455,-5.627462015,-26.34934127,-46.62683957,-17.37567406,-34.61479553,-31.62055336,5.1382801874,32.143910351,7.7843448176,12.784090909,-4.220596511,-24.36605752,-44.58691534,-15.27860995,-32.16419053,-30.03952569 +050,3,7,48,297,Texas,Live Oak County,11531,11527,11550,11504,11671,11831,12063,12177,12038,12157,12120,12236,12324,23,-46,167,160,232,114,-139,119,-37,116,88,35,103,120,124,130,137,133,118,141,147,143,34,110,111,135,109,138,133,131,126,100,113,1,-7,9,-11,21,-1,0,-13,15,47,30,1,6,9,8,15,18,17,9,5,7,7,22,-44,142,158,194,98,-156,124,-56,63,51,23,-38,151,166,209,116,-139,133,-51,70,58,-1,-1,7,5,2,-1,0,-1,-1,-1,0,1164,1164,1164,1156,1157,1156,1135,1139,1142,1144,1156,1156,8.935542639,10.355987055,10.552293422,10.881392818,11.303630363,10.984926698,9.7540814218,11.615932776,12.07094761,11.64495114,9.5428125271,9.5792880259,11.488383967,9.123629363,11.386138614,10.984926698,10.828683612,10.380195247,8.2115289867,9.2019543974,-0.607269888,0.7766990291,-0.936090545,1.7577634553,-0.082508251,0,-1.074602191,1.2357375293,3.8594186237,2.4429967427,0.5205170469,0.7766990291,0.680793124,1.2555453252,1.4851485149,1.404088375,0.7439553627,0.4119125098,0.5748070291,0.5700325733,-3.817125011,12.254584682,13.445664199,16.238386206,8.0858085809,-12.88457568,10.250051664,-4.61342011,5.1732632616,4.1530944625,-3.296607964,13.031283711,14.126457323,17.493931531,9.5709570957,-11.4804873,10.994007026,-4.2015076,5.7480702907,4.7231270358 +050,3,7,48,299,Texas,Llano County,19301,19303,19336,19073,19266,19509,19666,20080,20621,21199,21670,21810,21958,33,-263,193,243,157,414,541,578,471,140,148,36,136,157,154,163,167,186,151,158,170,167,52,301,294,313,283,298,298,328,330,353,381,-16,-165,-137,-159,-120,-131,-112,-177,-172,-183,-214,3,16,19,-1,5,-4,12,11,7,7,7,47,-113,303,392,265,539,640,742,635,315,358,50,-97,322,391,270,535,652,753,642,322,365,-1,-1,8,11,7,10,1,2,1,1,-3,184,184,184,173,162,159,169,159,137,146,126,127,7.0816735661,8.1900936383,7.9432624113,8.321633695,8.4033613445,9.1398245743,7.2214251554,7.371293942,7.8196872125,7.6311460428,15.673409878,15.336863246,16.144422953,14.447989789,14.995219645,14.643374856,15.68627451,15.395740512,16.237350506,17.409979894,-8.591736312,-7.146769608,-8.201160542,-6.126356094,-6.5918583,-5.503550281,-8.464849354,-8.02444657,-8.417663293,-9.778833851,0.8331380666,0.9911578288,-0.051579626,0.2552648373,-0.201278116,0.5896661016,0.5260640842,0.3265763139,0.3219871205,0.319868397,-5.884037595,15.80635906,20.219213411,13.529036375,27.122226136,31.44885875,35.485413678,29.625137045,14.489420423,16.358983732,-5.050899529,16.797516889,20.167633785,13.784301213,26.92094802,32.038524852,36.011477762,29.951713359,14.811407544,16.678852129 +050,3,7,48,301,Texas,Loving County,82,82,84,95,86,106,89,119,117,133,149,165,181,2,11,-9,20,-17,30,-2,16,16,16,16,0,2,2,2,2,2,3,0,2,0,0,0,1,2,2,1,2,1,3,1,1,0,0,1,0,0,1,0,2,-3,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,2,11,-9,20,-17,29,-4,19,13,16,16,2,11,-9,20,-17,29,-4,19,13,16,16,0,-1,0,0,-1,1,0,0,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,22.346368715,22.099447514,20.833333333,20.512820513,19.230769231,25.423728814,0,14.184397163,0,0,11.173184358,22.099447514,20.833333333,10.256410256,19.230769231,8.4745762712,24,7.0921985816,6.3694267516,0,11.173184358,0,0,10.256410256,0,16.949152542,-24,7.0921985816,-6.369426752,0,0,0,0,0,0,0,0,0,0,0,122.90502793,-99.44751381,208.33333333,-174.3589744,278.84615385,-33.89830508,152,92.19858156,101.91082803,92.485549133,122.90502793,-99.44751381,208.33333333,-174.3589744,278.84615385,-33.89830508,152,92.19858156,101.91082803,92.485549133 +050,3,7,48,303,Texas,Lubbock County,278831,278946,280332,283476,286062,289646,294591,298509,302326,305689,308084,311087,314772,1386,3144,2586,3584,4945,3918,3817,3363,2395,3003,3685,1077,3952,3853,3969,4242,4212,4194,4089,4039,3857,3865,510,2221,2202,2298,2264,2466,2387,2465,2668,2582,2762,567,1731,1651,1671,1978,1746,1807,1624,1371,1275,1103,79,329,382,394,452,511,486,468,341,311,245,696,1087,575,1520,2483,1666,1525,1266,683,1406,2324,775,1416,957,1914,2935,2177,2011,1734,1024,1717,2569,44,-3,-22,-1,32,-5,-1,5,0,11,13,11037,11037,10739,11035,11413,12305,12006,11771,12334,12347,12283,12280,14.018956808,13.530264881,13.788239872,14.521504116,14.203338392,13.960571538,13.450326061,13.161217584,12.458593829,12.351024752,7.8785685907,7.7325832517,7.9832137125,7.7502794243,8.315629742,7.9456090274,8.10835259,8.6937678914,8.340183891,8.8262691756,6.1403882173,5.7976816297,5.8050261591,6.7712246913,5.8877086495,6.0149625105,5.341973471,4.4674496923,4.1184099384,3.5247555759,1.167063965,1.3414381481,1.3687494355,1.5473172702,1.7231495532,1.6177486332,1.5394357047,1.1111599891,1.0045690124,0.7829239493,3.8559225836,2.0191804585,5.2804546749,8.4999751813,5.6179396392,5.0762688592,4.1643709448,2.2255785119,4.5415563713,7.4265928907,5.0229865486,3.3606186067,6.6492041104,10.047292452,7.3410891924,6.6940174923,5.7038066495,3.336738501,5.5461253838,8.2095168401 +050,3,7,48,305,Texas,Lynn County,5915,5915,5912,5883,5793,5726,5798,5746,5775,5828,5846,5956,6025,-3,-29,-90,-67,72,-52,29,53,18,110,69,21,70,81,78,80,60,78,87,65,64,67,4,53,59,66,44,57,54,67,63,47,53,17,17,22,12,36,3,24,20,2,17,14,0,-1,-1,-1,0,2,1,1,2,1,1,-21,-45,-114,-79,35,-58,5,32,15,92,55,-21,-46,-115,-80,35,-56,6,33,17,93,56,1,0,3,1,1,1,-1,0,-1,0,-1,42,42,42,42,42,42,42,42,42,42,42,42,11.869436202,13.874614594,13.542842261,13.884068032,10.395010395,13.540491277,14.996121693,11.135857461,10.845619387,11.184375261,8.9868588385,10.106200754,11.459328067,7.6362374176,9.8752598753,9.3741862686,11.548737396,10.793215693,7.964751737,8.8473416242,2.8825773633,3.7684138404,2.0835141939,6.2478306144,0.5197505198,4.1663050082,3.4473842972,0.342641768,2.8808676496,2.3370336366,-0.169563374,-0.171291538,-0.173626183,0,0.3465003465,0.173596042,0.1723692149,0.342641768,0.1694628029,0.166930974,-7.630351844,-19.52723535,-13.71646844,6.074279764,-10.04851005,0.8679802101,5.5158148755,2.5698132602,15.590577868,9.1812035723,-7.799915218,-19.69852689,-13.89009463,6.074279764,-9.702009702,1.0415762521,5.6881840903,2.9124550283,15.760040671,9.3481345464 +050,3,7,48,307,Texas,McCulloch County,8283,8284,8232,8256,8241,8244,8152,8253,8121,7934,7960,8011,7823,-52,24,-15,3,-92,101,-132,-187,26,51,-188,31,96,102,103,68,93,88,78,96,81,86,41,118,103,109,113,112,94,104,113,106,119,-10,-22,-1,-6,-45,-19,-6,-26,-17,-25,-33,0,-4,-3,2,7,6,1,1,1,1,1,-44,50,-10,8,-52,111,-126,-162,43,76,-154,-44,46,-13,10,-45,117,-125,-161,44,77,-153,2,0,-1,-1,-2,3,-1,0,-1,-1,-2,109,109,111,109,108,108,106,104,99,97,104,104,11.644832606,12.365884706,12.496208675,8.2947060259,11.338006705,10.748748015,9.7165991903,12.0800302,10.143384885,10.862700518,14.313440078,12.48711887,13.22414316,13.783849719,13.654373667,11.481617198,12.955465587,14.219202215,13.274059232,15.030946065,-2.668607472,-0.121234164,-0.727934486,-5.489143694,-2.316366961,-0.732869183,-3.238866397,-2.139172015,-3.130674347,-4.168245548,-0.485201359,-0.363702491,0.2426448286,0.8538667968,0.7314843036,0.1221448638,0.1245717845,0.1258336479,0.1252269739,0.1263104711,6.065016982,-1.212341638,0.9705793145,-6.34301049,13.532459616,-15.39025284,-20.18062909,5.4108468605,9.5172500157,-19.45181256,5.5798156235,-1.576044129,1.2132241432,-5.489143694,14.26394392,-15.26810798,-20.0560573,5.5366805084,9.6424769895,-19.32550208 +050,3,7,48,309,Texas,McLennan County,234906,234895,235904,237847,239369,241447,243182,245471,247573,251638,254204,257080,259730,1009,1943,1522,2078,1735,2289,2102,4065,2566,2876,2650,848,3401,3440,3412,3594,3628,3448,3364,3493,3455,3456,413,1960,1949,2165,2031,2189,2068,2088,2342,2180,2345,435,1441,1491,1247,1563,1439,1380,1276,1151,1275,1111,37,176,241,253,399,415,414,290,202,196,171,517,336,-167,599,-194,466,321,2489,1222,1397,1357,554,512,74,852,205,881,735,2779,1424,1593,1528,20,-10,-43,-21,-33,-31,-13,10,-9,8,11,9085,9086,8615,9342,9648,9413,9151,8529,9070,8346,8548,8550,14.357753335,14.416951653,14.19253935,14.831964245,14.848982816,13.986581319,13.477267128,13.810636523,13.514993624,13.374354211,8.2743888667,8.1682089452,9.0055239426,8.3816692769,8.9593228733,8.3887036451,8.3652002861,9.2598083987,8.527550246,9.0749018014,6.0833644678,6.2487427077,5.1870154071,6.4502949679,5.8896599427,5.5978776742,5.1120668415,4.5508281242,4.9874433778,4.29945241,0.7430063472,1.0100248106,1.0523776247,1.6466204045,1.6985468216,1.6793633023,1.1618333731,0.7986683589,0.7666971781,0.6617519011,1.4184666629,-0.699892711,2.4915976174,-0.800612427,1.9072839008,1.3021150242,9.9717353985,4.8315481909,5.464673254,5.2514463729,2.1614730101,0.3101320995,3.5439752421,0.8460079772,3.6058307224,2.9814783265,11.133568772,5.6302165498,6.2313704321,5.913198274 +050,3,7,48,311,Texas,McMullen County,707,707,711,697,731,762,801,831,810,766,727,733,721,4,-14,34,31,39,30,-21,-44,-39,6,-12,1,10,7,8,7,13,10,8,9,6,9,1,7,6,18,8,5,8,8,9,6,12,0,3,1,-10,-1,8,2,0,0,0,-3,0,1,1,3,9,3,2,1,0,0,0,3,-17,31,37,29,18,-24,-45,-40,6,-9,3,-16,32,40,38,21,-22,-44,-40,6,-9,1,-1,1,1,2,1,-1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,14.204545455,9.8039215686,10.71667783,8.9571337172,15.931372549,12.187690433,10.152284264,12.056262559,8.2191780822,12.379642366,9.9431818182,8.4033613445,24.112525117,10.236724248,6.1274509804,9.7501523461,10.152284264,12.056262559,8.2191780822,16.506189821,4.2613636364,1.4005602241,-13.39584729,-1.279590531,9.8039215686,2.4375380865,0,0,0,-4.126547455,1.4204545455,1.4005602241,4.0187541862,11.516314779,3.6764705882,2.4375380865,1.269035533,0,0,0,-24.14772727,43.417366947,49.564634963,37.1081254,22.058823529,-29.25045704,-57.10659898,-53.58338915,8.2191780822,-12.37964237,-22.72727273,44.817927171,53.583389149,48.624440179,25.735294118,-26.81291895,-55.83756345,-53.58338915,8.2191780822,-12.37964237 +050,3,7,48,313,Texas,Madison County,13664,13669,13737,13747,13739,13812,13857,13954,14127,14292,14417,14382,14427,68,10,-8,73,45,97,173,165,125,-35,45,44,144,148,154,166,157,144,174,160,189,181,42,111,127,138,138,124,138,122,165,134,139,2,33,21,16,28,33,6,52,-5,55,42,7,42,26,4,17,17,51,40,34,41,28,54,-64,-54,54,4,49,115,74,95,-132,-25,61,-22,-28,58,21,66,166,114,129,-91,3,5,-1,-1,-1,-4,-2,1,-1,1,1,0,2554,2560,2560,2572,2610,2598,2516,2608,2606,2584,2579,2582,10.478824043,10.769118824,11.17926754,11.998988037,11.290496566,10.256045013,12.245328829,11.146330419,13.125455745,12.56551772,8.0774268665,9.2410681802,10.017785198,9.9750623441,8.9173348675,9.8287098038,8.5858052711,11.494653245,9.3058786763,9.6497622271,2.4013971765,1.528050644,1.1614823418,2.023925693,2.3731616986,0.4273352089,3.6595235582,-0.348322826,3.8195770686,2.9157554931,3.0563236792,1.8918722259,0.2903705855,1.2288120279,1.2225378447,3.6323492753,2.8150181217,2.368595214,2.8473210875,1.9438369954,-4.65725513,-3.929273084,3.9200029037,0.2891322419,3.5237855525,8.1905915032,5.2077835251,6.6181336863,-9.166984965,-1.735568746,-1.600931451,-2.037400859,4.2103734892,1.5179442698,4.7463233972,11.822940778,8.0228016468,8.9867289003,-6.319663877,0.2082682495 +050,3,7,48,315,Texas,Marion County,10546,10542,10491,10485,10387,10293,10168,10152,10134,10076,9915,9848,9960,-51,-6,-98,-94,-125,-16,-18,-58,-161,-67,112,23,90,110,110,80,100,87,85,83,72,73,62,154,153,162,171,181,167,175,167,132,154,-39,-64,-43,-52,-91,-81,-80,-90,-84,-60,-81,0,0,0,-1,1,1,3,2,1,2,0,-11,58,-57,-40,-33,64,60,32,-79,-8,195,-11,58,-57,-41,-32,65,63,34,-78,-6,195,-1,0,2,-1,-2,0,-1,-2,1,-1,-2,167,167,162,154,157,162,165,153,154,145,144,144,8.5812356979,10.540436949,10.638297872,7.8197546552,9.842519685,8.5773439811,8.4116773874,8.3037366815,7.2863431665,7.3707592892,14.68344775,14.660789575,15.667311412,16.714725575,17.81496063,16.464556837,17.318159327,16.707518383,13.358295805,15.549273021,-6.102212052,-4.120352626,-5.02901354,-8.89497092,-7.972440945,-7.887212856,-8.90648194,-8.403781702,-6.071952639,-8.178513732,0,0,-0.096711799,0.0977469332,0.0984251969,0.2957704821,0.1979218209,0.1000450203,0.2023984213,0,5.530129672,-5.461862783,-3.868471954,-3.225648795,6.2992125984,5.9154096421,3.1667491341,-7.9035566,-0.809593685,19.68901454,5.530129672,-5.461862783,-3.965183752,-3.127901862,6.3976377953,6.2111801242,3.364670955,-7.80351158,-0.607195264,19.68901454 +050,3,7,48,317,Texas,Martin County,4799,4799,4809,4885,4976,5268,5457,5639,5627,5526,5668,5743,5816,10,76,91,292,189,182,-12,-101,142,75,73,20,71,85,85,107,112,114,88,75,82,88,19,37,37,45,36,50,42,44,58,43,43,1,34,48,40,71,62,72,44,17,39,45,0,-2,9,22,16,10,7,-1,-1,2,1,10,44,31,223,100,108,-90,-147,127,35,27,10,42,40,245,116,118,-83,-148,126,37,28,-1,0,3,7,2,2,-1,3,-1,-1,0,48,48,46,45,46,48,42,48,48,39,20,20,14.648236022,17.239630869,16.595080047,19.953379953,20.187454939,20.237883898,15.780507487,13.400035733,14.372097099,15.226230643,7.6335877863,7.5043099077,8.785630613,6.7132867133,9.0122566691,7.4560624889,7.8902537434,10.362694301,7.5365875033,7.4400899732,7.014648236,9.7353209614,7.8094494338,13.24009324,11.17519827,12.78182141,7.8902537434,3.0373414329,6.835509596,7.7861406696,-0.412626367,1.8253726803,4.2951971886,2.9836829837,1.8024513338,1.2426770815,-0.179323949,-0.178667143,0.3505389536,0.1730253482,9.0777800701,6.2873947875,43.537680594,18.648018648,19.466474405,-15.97727676,-26.36062046,22.690727175,6.1344316887,4.6716844018,8.6651537033,8.1127674678,47.832877782,21.631701632,21.268925739,-14.73459968,-26.53994441,22.512060032,6.4849706424,4.84470975 +050,3,7,48,319,Texas,Mason County,4012,4013,4010,4034,4056,4122,4101,4063,4159,4185,4263,4287,4344,-3,24,22,66,-21,-38,96,26,78,24,57,8,34,42,32,45,42,34,36,35,27,24,20,37,45,41,47,51,43,54,54,35,47,-12,-3,-3,-9,-2,-9,-9,-18,-19,-8,-23,3,20,13,12,18,14,13,8,4,7,3,7,7,14,61,-37,-44,93,35,94,25,78,10,27,27,73,-19,-30,106,43,98,32,81,-1,0,-2,2,0,1,-1,1,-1,0,-1,3,3,3,3,3,3,3,3,3,3,3,3,8.4535057185,10.383189122,7.8258742969,10.944910617,10.289073983,8.2704937971,8.6289549377,8.2859848485,6.3157894737,5.561348627,9.1994032819,11.124845488,10.026901443,11.431351088,12.493875551,10.459742155,12.943432407,12.784090909,8.1871345029,10.890974395,-0.745897563,-0.741656366,-2.201027146,-0.486440472,-2.204801568,-2.189248358,-4.314477469,-4.498106061,-1.871345029,-5.329625768,4.9726504227,3.2138442522,2.9347028613,4.3779642466,3.4296913278,3.1622476283,1.9175455417,0.946969697,1.6374269006,0.6951685784,1.7404276479,3.4610630408,14.918072878,-8.999148729,-10.77902989,22.622233033,8.389261745,22.253787879,5.8479532164,18.074383038,6.7130780706,6.674907293,17.85277574,-4.621184483,-7.34933856,25.784480662,10.306807287,23.200757576,7.485380117,18.769551616 +050,3,7,48,321,Texas,Matagorda County,36702,36702,36706,36675,36534,36483,36463,36747,37143,36848,36583,36655,36725,4,-31,-141,-51,-20,284,396,-295,-265,72,70,121,546,522,481,545,538,577,545,549,514,517,100,339,332,388,371,386,403,421,413,339,390,21,207,190,93,174,152,174,124,136,175,127,2,-12,7,-6,-3,25,70,37,18,33,28,-15,-226,-341,-135,-192,108,154,-458,-420,-135,-86,-13,-238,-334,-141,-195,133,224,-421,-402,-102,-58,-4,0,3,-3,1,-1,-2,2,1,-1,1,400,400,398,415,404,366,383,367,367,381,349,348,14.881236287,14.260541737,13.175014038,14.94256025,14.697445704,15.617810258,14.731521401,14.952812845,14.036429176,14.091032979,9.2394489037,9.0699230969,10.627662051,10.171907987,10.545007513,10.908106645,11.379762404,11.2486552,9.2574892815,10.629599346,5.6417873837,5.1906186398,2.5473519865,4.7706522633,4.1524381915,4.7097036135,3.3517589977,3.7041576446,4.7789398946,3.4614336331,-0.327060138,0.1912333183,-0.164345289,-0.082252625,0.6829668078,1.8947083503,1.0001216364,0.4902561588,0.901171523,0.7631507223,-6.159632602,-9.315794506,-3.697769013,-5.264168015,2.9504166098,4.1683583706,-12.37988404,-11.43931037,-3.686610776,-2.343962933,-6.486692741,-9.124561188,-3.862114302,-5.34642064,3.6333834176,6.0630667208,-11.3797624,-10.94905421,-2.785439253,-1.58081221 +050,3,7,48,323,Texas,Maverick County,54258,54258,54424,55233,55723,56475,57044,57643,57901,57883,57970,58357,58378,166,809,490,752,569,599,258,-18,87,387,21,232,1018,1035,1136,1092,1193,1131,1074,1020,1038,1019,100,324,340,348,362,402,409,389,372,410,410,132,694,695,788,730,791,722,685,648,628,609,-28,111,120,143,235,265,227,82,53,61,61,64,7,-326,-177,-398,-458,-692,-789,-615,-306,-647,36,118,-206,-34,-163,-193,-465,-707,-562,-245,-586,-2,-3,1,-2,2,1,1,4,1,4,-2,969,976,976,988,999,998,996,1014,1046,1069,1050,1049,18.566986148,18.656043837,20.249915328,19.239070112,20.804450374,19.576957696,18.551786084,17.608521143,17.846243778,17.458345826,5.9093354733,6.1285554634,6.2033191322,6.3777869784,7.0103847864,7.0795541093,6.7194085539,6.4219312405,7.0490943633,7.0244571037,12.657650674,12.527488374,14.046596196,12.861283133,13.794065587,12.497403587,11.832377531,11.186589903,10.797149415,10.433888722,2.0244945603,2.1630195753,2.5490650457,4.1402760771,4.6212735532,3.9292390778,1.4164305949,0.9149525692,1.048767698,1.0451021545,0.1276708281,-5.87620318,-3.155136455,-7.012042037,-7.986955801,-11.97812089,-13.62882609,-10.61690245,-5.261031403,-11.08493597,2.1521653884,-3.713183604,-0.606071409,-2.87176596,-3.365682248,-8.048881811,-12.2123955,-9.701949885,-4.212263705,-10.03983381 +050,3,7,48,325,Texas,Medina County,46006,46009,46130,46521,46812,47257,47851,48419,49239,50205,50933,51608,52358,121,391,291,445,594,568,820,966,728,675,750,120,547,487,495,576,605,553,631,610,576,576,67,347,350,396,416,421,395,420,450,451,491,53,200,137,99,160,184,158,211,160,125,85,8,3,1,-1,25,15,19,8,6,7,9,59,189,160,347,408,372,643,744,563,544,660,67,192,161,346,433,387,662,752,569,551,669,1,-1,-7,0,1,-3,0,3,-1,-1,-4,2309,2316,2328,2366,2360,2376,2343,2336,2387,2387,2305,2304,11.80775167,10.435751556,10.524189691,12.112545737,12.568816869,11.325237052,12.690559511,12.062726176,11.234530578,11.080545563,7.4904750084,7.5000267858,8.4193517524,8.7479496993,8.7462345487,8.089455037,8.4469651261,8.898732425,8.7964814074,9.4453956101,4.3172766619,2.9357247704,2.1048379381,3.3645960382,3.8225823206,3.2357820148,4.2435943848,3.1639937511,2.4380491706,1.6351499529,0.0647591499,0.021428648,-0.021260989,0.525718131,0.3116235587,0.3891130271,0.1608945738,0.1186497657,0.1365307536,0.1731335244,4.0798264455,3.4285836735,7.377563278,8.5797198974,7.7282642568,13.168404022,14.963195366,11.133303012,10.61038999,12.696458458,4.1445855954,3.4500123215,7.3563022887,9.1054380283,8.0398878155,13.557517049,15.12408994,11.251952777,10.746920744,12.869591982 +050,3,7,48,327,Texas,Menard County,2242,2242,2230,2215,2205,2138,2129,2135,2097,2115,2103,2099,2124,-12,-15,-10,-67,-9,6,-38,18,-12,-4,25,3,11,18,26,23,16,17,13,22,13,16,16,42,34,30,29,42,35,32,37,29,24,-13,-31,-16,-4,-6,-26,-18,-19,-15,-16,-8,0,3,3,2,3,2,4,2,1,3,2,1,13,4,-67,-7,30,-24,35,2,10,31,1,16,7,-65,-4,32,-20,37,3,13,33,0,0,-1,2,1,0,0,0,0,-1,0,38,38,38,41,40,38,38,37,41,38,39,39,4.9493813273,8.1447963801,11.973290352,10.780407781,7.5046904315,8.034026465,6.1728395062,10.431484116,6.1875297477,7.5775515037,18.897637795,15.384615385,13.815335022,13.592688071,19.699812383,16.540642722,15.194681861,17.543859649,13.802950976,11.366327256,-13.94825647,-7.239819005,-1.84204467,-2.812280291,-12.19512195,-8.506616257,-9.021842355,-7.112375533,-7.615421228,-3.788775752,1.3498312711,1.3574660633,0.9210223348,1.4061401453,0.9380863039,1.8903591682,0.9496676163,0.4741583689,1.4278914802,0.947193938,5.8492688414,1.8099547511,-30.85424822,-3.280993672,14.071294559,-11.34215501,16.619183286,0.9483167378,4.7596382675,14.681506038,7.1991001125,3.1674208145,-29.93322588,-1.874853527,15.009380863,-9.451795841,17.568850902,1.4224751067,6.1875297477,15.628699976 +050,3,7,48,329,Texas,Midland County,136872,136887,136987,140247,147365,152387,156767,162381,163928,165417,172537,176444,177863,100,3260,7118,5022,4380,5614,1547,1489,7120,3907,1419,545,2261,2408,2637,2750,2918,2968,2872,2967,2970,3025,228,1029,983,1055,1032,1078,1107,1091,1112,1122,1222,317,1232,1425,1582,1718,1840,1861,1781,1855,1848,1803,12,96,201,284,495,554,564,464,334,358,295,-226,1921,5273,3058,2095,3163,-878,-755,4910,1694,-696,-214,2017,5474,3342,2590,3717,-314,-291,5244,2052,-401,-3,11,219,98,72,57,0,-1,21,7,17,1678,1678,1657,1673,1676,1668,1674,1654,1604,1640,1554,1553,16.311130669,16.744781164,17.594544824,17.790486295,18.286186973,18.191346239,17.440677709,17.55860265,17.02098395,17.075586991,7.4233319146,6.8355979584,7.039152366,6.6762843114,6.7554864828,6.784979881,6.625271372,6.5807772655,6.4301494924,6.8979726621,8.8877987548,9.9091832052,10.555392458,11.114201983,11.53070049,11.406366358,10.815406337,10.977825385,10.590834458,10.177614329,0.6925557471,1.3977163679,1.8948997838,3.2022875331,3.4717435171,3.4568461182,2.8177139474,1.9766003657,2.0516876277,1.665222533,13.858329065,36.667454765,20.403533588,13.553115923,19.82152481,-5.38140229,-4.584857824,29.057208969,9.7082649199,-3.928796213,14.550884812,38.065171133,22.298433372,16.755403456,23.293268327,-1.924556172,-1.767143876,31.033809335,11.759952548,-2.26357368 +050,3,7,48,331,Texas,Milam County,24757,24759,24683,24610,24116,24096,24147,24364,24678,24907,24970,24721,24708,-76,-73,-494,-20,51,217,314,229,63,-249,-13,70,297,299,305,320,326,326,283,297,246,250,84,284,269,286,291,304,308,305,310,273,303,-14,13,30,19,29,22,18,-22,-13,-27,-53,3,29,19,19,10,10,-4,-6,-7,-6,-3,-66,-114,-560,-56,18,188,301,259,85,-215,42,-63,-85,-541,-37,28,198,297,253,78,-221,39,1,-1,17,-2,-6,-3,-1,-2,-2,-1,1,405,405,395,401,412,406,433,416,421,403,394,394,12.050392551,12.272708616,12.652451672,13.266173331,13.440250665,13.294726969,11.414742362,11.90929687,9.9011893502,10.11551923,11.522934291,11.041333169,11.864266158,12.063926373,12.533239884,12.560662289,12.302107492,12.430579225,10.987905254,12.260009306,0.5274582598,1.2313754464,0.788185514,1.2022469581,0.9070107811,0.7340646793,-0.887365131,-0.521282355,-1.086715904,-2.144490077,1.1766376565,0.779871116,0.788185514,0.4145679166,0.4122776278,-0.163125484,-0.242008672,-0.280690499,-0.241492423,-0.121386231,-4.625403201,-22.985675,-2.323073094,0.7462222499,7.7508194018,12.275192692,10.446707674,3.4083846262,-8.653478497,1.6994072306,-3.448765545,-22.20580388,-1.53488758,1.1607901664,8.1630970295,12.112067208,10.204699002,3.1276941276,-8.89497092,1.5780209998 +050,3,7,48,333,Texas,Mills County,4936,4941,4969,4883,4833,4873,4871,4887,4886,4923,4865,4872,4840,28,-86,-50,40,-2,16,-1,37,-58,7,-32,15,39,40,41,45,56,38,36,33,37,35,7,65,71,66,68,57,71,65,66,70,78,8,-26,-31,-25,-23,-1,-33,-29,-33,-33,-43,0,5,2,1,4,1,5,3,2,3,4,19,-66,-19,65,17,16,27,63,-26,38,7,19,-61,-17,66,21,17,32,66,-24,41,11,1,1,-2,-1,0,0,0,0,-1,-1,0,151,151,151,147,147,138,145,138,146,135,145,145,7.9171741778,8.2338410869,8.4483824438,9.236453202,11.477761836,7.7765271667,7.3401977776,6.7429505517,7.5998767588,7.2075782537,13.195290296,14.615067929,13.599835154,13.957307061,11.682721869,14.529827075,13.253134876,13.485901103,14.378145219,16.062602965,-5.278116119,-6.381226842,-5.15145271,-4.720853859,-0.204960033,-6.753299908,-5.912937099,-6.742950552,-6.778268461,-8.855024712,1.0150223305,0.4116920543,0.2060581084,0.8210180624,0.2049600328,1.0232272588,0.6116831481,0.4086636698,0.6162062237,0.823723229,-13.39829476,-3.911074516,13.393777045,3.4893267652,3.2793605247,5.5254271974,12.845346111,-5.312627707,7.8052788333,1.4415156507,-12.38327243,-3.499382462,13.599835154,4.3103448276,3.4843205575,6.5486544562,13.457029259,-4.903964038,8.421485057,2.2652388797 +050,3,7,48,335,Texas,Mitchell County,9403,9403,9411,9397,9332,9002,9075,8863,8481,8234,8201,8161,8202,8,-14,-65,-330,73,-212,-382,-247,-33,-40,41,31,90,99,104,95,99,90,112,95,92,88,29,105,86,105,99,104,110,99,87,70,75,2,-15,13,-1,-4,-5,-20,13,8,22,13,0,-2,0,-2,1,0,4,4,4,6,4,6,4,-79,-342,74,-212,-370,-266,-44,-69,24,6,2,-79,-344,75,-212,-366,-262,-40,-63,28,0,-1,1,15,2,5,4,2,-1,1,0,2406,2413,2411,2422,2056,2086,1898,1667,1438,1495,1445,1439,9.5703955764,10.571840461,11.345041998,10.510593572,11.038019846,10.378228782,13.401136704,11.560693642,11.245569001,10.755973843,11.165461506,9.1836189866,11.454128941,10.95314488,11.595495596,12.684501845,11.845647622,10.587161545,8.5564111967,9.167023162,-1.595065929,1.3882214747,-0.109086942,-0.442551308,-0.55747575,-2.306273063,1.5554890817,0.9735320961,2.6891578047,1.5889506814,-0.212675457,0,-0.218173885,0.1106378271,0,0.4612546125,0.4786120251,0.4867660481,0.733406674,0.488907902,0.4253509145,-8.436115116,-37.30773426,8.1871992034,-23.63697179,-42.66605166,-31.82769967,-5.354426529,-8.434176751,2.9334474118,0.2126754573,-8.436115116,-37.52590815,8.2978370305,-23.63697179,-42.20479705,-31.34908765,-4.867660481,-7.700770077,3.4223553138 +050,3,7,48,337,Texas,Montague County,19719,19722,19719,19760,19477,19386,19366,19254,19387,19408,19596,19848,19962,-3,41,-283,-91,-20,-112,133,21,188,252,114,63,250,211,228,220,233,232,238,190,200,189,50,275,257,297,234,287,273,281,263,269,293,13,-25,-46,-69,-14,-54,-41,-43,-73,-69,-104,1,3,13,6,2,1,11,-1,-2,2,-2,-16,65,-252,-28,-4,-57,163,65,264,320,222,-15,68,-239,-22,-2,-56,174,64,262,322,220,-1,-2,2,0,-4,-2,0,0,-1,-1,-2,266,266,265,213,186,204,240,212,181,214,212,212,12.664961119,10.755154573,11.733525461,11.354252684,12.066286898,12.007970808,12.269622374,9.7425905035,10.140959335,9.4951017332,13.93145723,13.099880215,15.284460798,12.076796036,14.862765407,14.130069098,14.486402887,13.485796329,13.639590305,14.719919618,-1.266496112,-2.344725642,-3.550935337,-0.722543353,-2.796478509,-2.122098289,-2.216780513,-3.743205825,-3.49863097,-5.224817885,0.1519795334,0.6626398552,0.3087769858,0.1032204789,0.051786639,0.5693434435,-0.051553035,-0.102553584,0.1014095933,-0.100477267,3.2928898908,-12.84501873,-1.440959267,-0.206440958,-2.951838426,8.4366346627,3.350947287,13.537073121,16.225534936,11.152976639,3.4448694243,-12.18237888,-1.132182281,-0.103220479,-2.900051787,9.0059781062,3.2993942518,13.434519536,16.326944529,11.052499372 +050,3,7,48,339,Texas,Montgomery County,455746,455740,459223,471456,484627,498488,517262,535913,555338,571542,590127,607583,626351,3483,12233,13171,13861,18774,18651,19425,16204,18585,17456,18768,1521,6350,6402,6418,6772,7101,7461,7266,7265,7404,7586,766,2924,2995,3131,3324,3434,3668,3712,4028,4262,4800,755,3426,3407,3287,3448,3667,3793,3554,3237,3142,2786,348,1493,1341,967,1589,1687,1516,1404,1029,930,764,2229,7278,8223,9419,13383,13135,14059,11216,14287,13414,15305,2577,8771,9564,10386,14972,14822,15575,12620,15316,14344,16069,151,36,200,188,354,162,57,30,32,-30,-87,3224,3230,3291,3345,3296,3273,3233,3233,3204,3192,3124,3123,13.645950967,13.392142732,13.056458298,13.333989663,13.484938401,13.674214273,12.895783047,12.507865838,12.363593858,12.295633316,6.2835843508,6.265146436,6.3695498492,6.5449175486,6.5212334133,6.7225597044,6.5881016612,6.9348497722,7.116914779,7.7799947161,7.3623666162,7.1269962963,6.6869084492,6.7890721142,6.9637049873,6.9516545689,6.3076813858,5.5730160657,5.2466790792,4.5156385998,3.2084102037,2.8051957832,1.9672164498,3.1287226188,3.2036461177,2.7784625169,2.4918358654,1.771588981,1.5529635722,1.2383158256,15.64019388,17.20143544,19.161542648,26.350972188,24.943622855,25.766757602,19.906289933,24.597368097,22.399412212,24.806837319,18.848604084,20.006631223,21.128759097,29.479694807,28.147268972,28.545220119,22.398125799,26.368957078,23.952375784,26.045153144 +050,3,7,48,341,Texas,Moore County,21904,21904,22008,22075,22431,22139,21975,21709,21638,21571,21053,20931,20654,104,67,356,-292,-164,-266,-71,-67,-518,-122,-277,96,406,411,429,431,429,462,399,372,400,388,19,139,148,129,142,166,151,153,140,138,135,77,267,263,300,289,263,311,246,232,262,253,42,179,196,142,140,65,69,37,19,28,26,-14,-380,-103,-754,-606,-603,-453,-353,-770,-413,-552,28,-201,93,-612,-466,-538,-384,-316,-751,-385,-526,-1,1,0,20,13,9,2,3,1,1,-4,154,154,146,148,154,155,153,153,151,142,146,146,18.419799015,18.469419854,19.250617007,19.540281997,19.641058511,21.316354073,18.468374644,17.454954955,19.054878049,18.660574726,6.3062858698,6.6507886577,5.788647072,6.4378655302,7.6000366267,6.9670334741,7.0818579463,6.5690690691,6.5739329268,6.4927257425,12.113513146,11.818631196,13.461969935,13.102416466,12.041021884,14.349320599,11.386516698,10.885885886,12.480945122,12.167848984,8.1210443935,8.8078011953,6.3719991025,6.3471913678,2.9759179562,3.1836113226,1.71260617,0.8915165165,1.3338414634,1.2504508837,-17.24020598,-4.628589404,-33.83441777,-27.47427121,-27.60736196,-20.90110042,-16.33918859,-36.12987988,-19.67416159,-26.54803415,-9.119161582,4.1792117917,-27.46241867,-21.12707984,-24.63144401,-17.7174891,-14.62658242,-35.23836336,-18.34032012,-25.29758326 +050,3,7,48,343,Texas,Morris County,12934,12934,12918,12769,12698,12674,12599,12360,12420,12360,12269,12343,12393,-16,-149,-71,-24,-75,-239,60,-60,-91,74,50,39,150,159,159,153,138,158,160,136,146,148,55,164,172,172,151,172,178,183,182,168,156,-16,-14,-13,-13,2,-34,-20,-23,-46,-22,-8,2,2,7,7,0,1,0,-2,-2,-2,-1,0,-137,-66,-16,-77,-206,82,-36,-42,99,59,2,-135,-59,-9,-77,-205,82,-38,-44,97,58,-2,0,1,-2,0,0,-2,1,-1,-1,0,145,145,144,144,144,145,144,144,144,133,138,138,11.679059446,12.486747556,12.533501498,12.10778301,11.058135342,12.752219532,12.913640032,11.043891348,11.864131318,11.966364812,12.769104995,13.507676601,13.558253192,11.949511336,13.78260347,14.366424536,14.769975787,14.779325186,13.651877133,12.613195343,-1.090045548,-1.020929045,-1.024751695,0.1582716733,-2.724468128,-1.614205004,-1.856335755,-3.735433838,-1.787745815,-0.64683053,0.1557207926,0.5497310245,0.5517893741,0,0.0801314155,0,-0.1614205,-0.162410167,-0.162522347,-0.080853816,-10.66687429,-5.183178231,-1.261232855,-6.093459423,-16.5070716,6.6182405165,-2.905569007,-3.410613504,8.0448561677,4.7703751617,-10.5111535,-4.633447206,-0.709443481,-6.093459423,-16.42694018,6.6182405165,-3.066989508,-3.573023671,7.8823338209,4.6895213454 +050,3,7,48,345,Texas,Motley County,1210,1205,1205,1200,1197,1192,1149,1146,1169,1226,1234,1200,1185,0,-5,-3,-5,-43,-3,23,57,8,-34,-15,5,9,9,11,5,5,6,14,11,8,14,7,22,15,15,20,12,16,21,17,15,20,-2,-13,-6,-4,-15,-7,-10,-7,-6,-7,-6,0,0,0,0,0,0,0,0,0,0,0,2,7,5,-3,-28,4,32,64,13,-27,-8,2,7,5,-3,-28,4,32,64,13,-27,-8,0,1,-2,2,0,0,1,0,1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,7.4844074844,7.5093867334,9.2088740059,4.2716787698,4.3572984749,5.1835853132,11.691022965,8.9430894309,6.5735414955,11.740041929,18.295218295,12.515644556,12.557555463,17.086715079,10.45751634,13.822894168,17.536534447,13.821138211,12.325390304,16.77148847,-10.81081081,-5.006257822,-3.348681457,-12.81503631,-6.100217865,-8.639308855,-5.845511482,-4.87804878,-5.751848809,-5.031446541,0,0,0,0,0,0,0,0,0,0,5.8212058212,4.1718815186,-2.511511093,-23.92140111,3.48583878,27.645788337,53.444676409,10.569105691,-22.18570255,-6.708595388,5.8212058212,4.1718815186,-2.511511093,-23.92140111,3.48583878,27.645788337,53.444676409,10.569105691,-22.18570255,-6.708595388 +050,3,7,48,347,Texas,Nacogdoches County,64524,64524,64684,65656,65868,65188,65235,65456,65532,65231,65039,64846,64753,160,972,212,-680,47,221,76,-301,-192,-193,-93,239,934,903,906,884,861,870,778,788,804,794,99,582,543,555,574,616,540,550,608,593,643,140,352,360,351,310,245,330,228,180,211,151,17,74,122,80,107,47,-4,-14,-26,-28,-23,5,544,-267,-1138,-375,-63,-247,-518,-346,-377,-224,22,618,-145,-1058,-268,-16,-251,-532,-372,-405,-247,-2,2,-3,27,5,-8,-3,3,0,1,3,5144,5146,5386,5179,4987,4968,4958,5023,4979,4806,4584,4586,14.331747737,13.731334205,13.826150653,13.555891216,13.176117713,13.283659572,11.8993905,12.097950411,12.380182469,12.253180966,8.930489489,8.2570481433,8.469661824,8.8021284589,9.4268159246,8.2450300791,8.4121655208,9.3344592001,9.1311544828,9.9229160719,5.4012582477,5.4742860619,5.3564888292,4.7537627566,3.7493017882,5.0386294928,3.4872249795,2.7634912106,3.2490279863,2.330264894,1.1354917907,1.855174721,1.2208521548,1.6408148869,0.7192538124,-0.061074297,-0.21412785,-0.399170953,-0.431150633,-0.35494101,8.34739911,-4.060095496,-17.3666219,-5.750519464,-0.964106174,-3.771337832,-7.922730436,-5.312044216,-5.805135312,-3.456816796,9.4828909007,-2.204920775,-16.14576975,-4.109704577,-0.244852362,-3.832412129,-8.136858286,-5.711215168,-6.236285945,-3.811757807 +050,3,7,48,349,Texas,Navarro County,47735,47840,47870,48072,48157,48036,47907,48167,48403,48744,49556,49978,50694,30,202,85,-121,-129,260,236,341,812,422,716,168,666,668,687,765,699,694,709,686,636,645,126,467,491,492,507,550,551,587,525,553,614,42,199,177,195,258,149,143,122,161,83,31,1,5,4,0,4,25,56,25,14,20,18,-6,0,-91,-316,-395,90,41,196,638,320,671,-5,5,-87,-316,-391,115,97,221,652,340,689,-7,-2,-5,0,4,-4,-4,-2,-1,-1,-4,832,832,814,872,861,694,707,720,738,741,681,681,13.88338788,13.883548618,14.283783643,15.946968513,14.551283386,14.372993683,14.596436328,13.957273652,12.779552716,12.813890655,9.7350482583,10.20482391,10.229434574,10.56877521,11.449507671,11.411411411,12.084778737,10.681586979,11.111780899,12.198029243,4.1483396219,3.6787247088,4.0543490691,5.3781933023,3.1017757146,2.9615822719,2.5116575911,3.2756866734,1.6677718167,0.6158614113,0.1042296387,0.0831350217,0,0.0833828419,0.5204321669,1.1597804701,0.5146839326,0.2848423194,0.4018727269,0.3575969485,0,-1.891321743,-6.570124645,-8.234055637,1.8735558007,0.8491249871,4.0351220316,12.980671414,6.4299636305,13.33041958,0.1042296387,-1.808186721,-6.570124645,-8.150672795,2.3939879676,2.0089054572,4.5498059642,13.265513733,6.8318363574,13.688016529 +050,3,7,48,351,Texas,Newton County,14445,14445,14447,14562,14433,14343,14294,14161,14162,13909,13784,13673,13414,2,115,-129,-90,-49,-133,1,-253,-125,-111,-259,25,147,157,133,141,157,133,114,121,106,106,19,155,166,167,169,155,154,167,155,175,211,6,-8,-9,-34,-28,2,-21,-53,-34,-69,-105,1,5,8,7,0,0,0,0,0,0,0,-4,118,-130,-64,-18,-135,24,-201,-91,-42,-153,-3,123,-122,-57,-18,-135,24,-201,-91,-42,-153,-1,0,2,1,-3,0,-2,1,0,0,-1,724,724,721,720,723,724,726,726,725,724,723,723,10.134785756,10.829453354,9.2438142897,9.8474002165,11.034967493,9.3916604879,8.1222614086,8.7386704221,7.7211640019,7.826632702,10.686338722,11.450250043,11.606894634,11.802912316,10.894394658,10.874554249,11.898400484,11.19416459,12.74720472,15.579429247,-0.551552966,-0.620796689,-2.363080345,-1.9555121,0.1405728343,-1.482893761,-3.776139076,-2.455494168,-5.026040718,-7.752796544,0.344720604,0.5518192792,0.4865165416,0,0,0,0,0,0,0,8.1354062532,-8.967063287,-4.448151237,-1.257114921,-9.488666315,1.6947357271,-14.32082933,-6.572057921,-3.059329133,-11.29693211,8.4801268572,-8.415244008,-3.961634696,-1.257114921,-9.488666315,1.6947357271,-14.32082933,-6.572057921,-3.059329133,-11.29693211 +050,3,7,48,353,Texas,Nolan County,15216,15214,15247,15147,14939,15076,15139,15128,15082,14912,14845,14833,14835,33,-100,-208,137,63,-11,-46,-170,-67,-12,2,54,172,201,209,236,204,204,192,190,201,195,23,202,173,180,196,177,174,176,186,162,174,31,-30,28,29,40,27,30,16,4,39,21,0,5,7,8,16,23,50,38,29,38,31,4,-74,-249,98,9,-61,-125,-225,-100,-90,-50,4,-69,-242,106,25,-38,-75,-187,-71,-52,-19,-2,-1,6,2,-2,0,-1,1,0,1,0,410,410,409,413,417,413,416,411,413,416,419,419,11.318023294,13.36169647,13.926370148,15.621380109,13.480027753,13.505461768,12.802560512,12.770104513,13.545387155,13.145476608,13.292097124,11.500365619,11.994002999,12.973688565,11.695906433,11.519364449,11.735680469,12.501260208,10.917177707,11.729809896,-1.97407383,1.8613308516,1.9323671498,2.6476915439,1.7841213202,1.9860973188,1.0668800427,0.2688443055,2.6282094481,1.4156667116,0.3290123051,0.4653327129,0.5330667999,1.0590766176,1.5198070506,3.3101621979,2.5338401014,1.9491212152,2.5608194622,2.0897937171,-4.869382115,-16.55254936,6.5300682992,0.5957305974,-4.030792612,-8.275405495,-15.0030006,-6.721107639,-6.065098726,-3.370635028,-4.54036981,-16.08721665,7.0631350991,1.654807215,-2.510985562,-4.965243297,-12.4691605,-4.771986423,-3.504279264,-1.280841311 +050,3,7,48,355,Texas,Nueces County,340223,340223,340251,343278,347966,352987,356717,360587,361753,361328,362177,362347,363148,28,3027,4688,5021,3730,3870,1166,-425,849,170,801,1140,4683,4651,4894,5105,5138,4928,4590,4596,4476,4467,693,2624,2630,2826,2793,2861,2826,2907,2965,2997,3227,447,2059,2021,2068,2312,2277,2102,1683,1631,1479,1240,121,469,744,622,753,814,710,565,375,389,328,-537,506,1925,2315,712,804,-1638,-2675,-1157,-1710,-790,-416,975,2669,2937,1465,1618,-928,-2110,-782,-1321,-462,-3,-7,-2,16,-47,-25,-8,2,0,12,23,5792,5797,5843,5787,6006,6138,6652,6672,6993,6794,6742,6740,13.702417893,13.456897998,13.963846363,14.38627935,14.325864626,13.64454412,12.695673099,12.704818902,12.355698362,12.314350891,7.6778015271,7.6094693046,8.0633080963,7.8708870177,7.977092,7.824570147,8.0405929626,8.1962114982,8.273017871,8.8959951481,6.0246163659,5.8474286938,5.9005382672,6.5153923326,6.3487726264,5.8199739735,4.6550801363,4.5086074042,4.0826804909,3.4183557433,1.3722899833,2.1526407462,1.7747266935,2.1220114301,2.2696095379,1.9658332641,1.5627571462,1.0366203413,1.0738084591,0.9042102289,1.4805516664,5.5696685975,6.6052930796,2.0064703031,2.2417273569,-4.535260404,-7.398894453,-3.198319293,-4.720340527,-2.177823417,2.8528416497,7.7223093437,8.3800197731,4.1284817332,4.5113368948,-2.56942714,-5.836137307,-2.161698952,-3.646532068,-1.273613188 +050,3,7,48,357,Texas,Ochiltree County,10223,10223,10171,10444,10611,10701,10709,10690,10259,10004,9861,9815,9598,-52,273,167,90,8,-19,-431,-255,-143,-46,-217,33,187,174,168,195,196,188,178,153,123,139,28,63,85,103,90,102,84,81,70,51,73,5,124,89,65,105,94,104,97,83,72,66,5,24,12,9,18,11,23,2,-4,2,7,-68,125,66,17,-117,-125,-561,-357,-224,-119,-289,-63,149,78,26,-99,-114,-538,-355,-228,-117,-282,6,0,0,-1,2,1,3,3,2,-1,-1,54,54,54,27,45,43,29,27,28,27,22,22,18.142129517,16.528140584,15.765765766,18.215787015,18.318613019,17.948350757,17.56896807,15.403976844,12.502541167,14.320300829,6.1120543294,8.0740916647,9.6659159159,8.4072863148,9.5331557549,8.01947587,7.9948674925,7.047571105,5.1839804838,7.5207335291,12.030075188,8.4540489195,6.0998498498,9.8085007006,8.7854572644,9.9288748866,9.5741005774,8.3564057387,7.3185606831,6.7995673003,2.3284016493,1.1398717644,0.8445945946,1.681457263,1.0280854246,2.1958088692,0.1974041356,-0.402718349,0.2032933523,0.7211662288,12.127091923,6.2692947043,1.5953453453,-10.92947221,-11.68278892,-53.55864242,-35.23663821,-22.55222754,-12.09595446,-29.77386288,14.455493573,7.4091664688,2.4399399399,-9.248014946,-10.65470349,-51.36283355,-35.03923407,-22.95494588,-11.89266111,-29.05269665 +050,3,7,48,359,Texas,Oldham County,2052,2052,2050,2072,2046,2087,2068,2064,2071,2106,2122,2115,2135,-2,22,-26,41,-19,-4,7,35,16,-7,20,5,15,19,20,33,22,19,27,25,19,20,5,15,13,20,14,19,15,16,13,15,8,0,0,6,0,19,3,4,11,12,4,12,0,0,0,0,0,0,1,1,0,1,0,-2,23,-33,40,-39,-7,1,24,2,-11,8,-2,23,-33,40,-39,-7,2,25,2,-10,8,0,-1,1,1,1,0,1,-1,2,-1,0,282,282,282,282,280,279,279,278,277,277,277,277,7.2780203785,9.227780476,9.6781998548,15.884476534,10.648596321,9.1898428053,12.927938712,11.825922422,8.9686098655,9.4117647059,7.2780203785,6.3137445362,9.6781998548,6.7388688327,9.1965150048,7.2551390568,7.6610007182,6.1494796594,7.0804814727,3.7647058824,0,2.9140359398,0,9.1456077016,1.4520813166,1.9347037485,5.2669379938,5.6764427625,1.8881283927,5.6470588235,0,0,0,0,0,0.4836759371,0.4788125449,0,0.4720320982,0,11.159631247,-16.02719767,19.35639971,-18.77256318,-3.388189739,0.4836759371,11.491501077,0.9460737938,-5.19235308,3.7647058824,11.159631247,-16.02719767,19.35639971,-18.77256318,-3.388189739,0.9673518742,11.970313622,0.9460737938,-4.720320982,3.7647058824 +050,3,7,48,361,Texas,Orange County,81837,81839,82015,82350,82908,82853,83301,84026,84652,85056,83207,83086,82878,176,335,558,-55,448,725,626,404,-1849,-121,-208,264,986,1098,1134,1129,1202,1191,1127,1046,1040,1019,180,885,892,955,960,937,938,1054,1093,906,982,84,101,206,179,169,265,253,73,-47,134,37,7,7,7,7,7,24,22,10,8,6,10,91,230,361,-233,292,443,356,325,-1814,-262,-258,98,237,368,-226,299,467,378,335,-1806,-256,-248,-6,-3,-16,-8,-20,-7,-5,-4,4,1,3,639,639,614,648,651,677,706,683,675,640,609,608,11.997688072,13.28831282,13.682349889,13.589802232,14.367077638,14.121580763,13.281636694,12.432917516,12.508043032,12.279771517,10.768715968,10.79524138,11.522613884,11.555544856,11.199627078,11.121782331,12.42133547,12.991566773,10.896429796,11.833891687,1.2289721048,2.4930714398,2.1597360055,2.0342573757,3.1674505609,2.9997984325,0.8603012233,-0.558649257,1.6116132369,0.4458798294,0.0851762845,0.0847160198,0.0844589499,0.0842591812,0.286863447,0.2608520376,0.1178494826,0.0950892353,0.0721617867,0.120508062,2.7986493475,4.3689261639,-2.811276476,3.5148115604,5.2950211263,4.221060245,3.8301081858,-21.56148411,-3.151064687,-3.109107999,2.883825632,4.4536421837,-2.726817526,3.5990707416,5.5818845733,4.4819122826,3.9479576685,-21.46639487,-3.0789029,-2.988599937 +050,3,7,48,363,Texas,Palo Pinto County,28111,28134,28093,28059,27862,27878,28033,27963,28131,28554,28843,29114,29320,-41,-34,-197,16,155,-70,168,423,289,271,206,75,337,388,384,374,354,349,338,373,338,344,94,304,283,325,293,339,359,333,344,344,407,-19,33,105,59,81,15,-10,5,29,-6,-63,2,0,9,11,17,18,20,14,6,6,5,-21,-68,-318,-50,62,-99,159,405,253,271,263,-19,-68,-309,-39,79,-81,179,419,259,277,268,-3,1,7,-4,-5,-4,-1,-1,1,0,1,263,263,261,264,269,267,273,280,268,273,260,260,12.00313435,13.876718943,13.778256189,13.378404965,12.643760269,12.443398581,11.925553497,12.997194975,11.663819728,11.773967211,10.827753241,10.121421291,11.661284535,10.480942927,12.108007715,12.799942953,11.749139984,11.9866892,11.870869783,13.93024609,1.1753811084,3.755297652,2.1169716541,2.8974620379,0.5357525538,-0.356544372,0.1764135133,1.0105057756,-0.207050054,-2.156278879,0,0.3218826559,0.3946896304,0.6081093166,0.6429030645,0.7130887439,0.4939578372,0.2090701605,0.2070500544,0.1711332443,-2.421997436,-11.37318717,-1.794043775,2.2178104487,-3.535966855,5.669055514,14.289494575,8.8157917661,9.3517607882,9.0016086525,-2.421997436,-11.05130452,-1.399354144,2.8259197653,-2.89306379,6.3821442579,14.783452412,9.0248619266,9.5588108425,9.1727418968 +050,3,7,48,365,Texas,Panola County,23796,23794,23770,24008,24000,23791,23749,23661,23407,23165,23069,23103,23187,-24,238,-8,-209,-42,-88,-254,-242,-96,34,84,60,316,296,295,277,302,287,263,254,264,261,100,270,265,278,286,262,275,278,285,250,280,-40,46,31,17,-9,40,12,-15,-31,14,-19,4,27,15,18,18,23,4,-2,-3,-2,-1,15,166,-55,-245,-49,-149,-271,-226,-60,22,103,19,193,-40,-227,-31,-126,-267,-228,-63,20,102,-3,-1,1,1,-2,-2,1,1,-2,0,1,358,358,372,359,358,404,392,381,374,376,346,345,13.227845452,12.33127812,12.345420686,11.653344552,12.739928285,12.195121951,11.294339947,10.987584894,11.435502036,11.276733636,11.302273013,11.039826696,11.633989663,12.031973075,11.052520565,11.685221382,11.938503822,12.32858935,10.829073898,12.09764528,1.9255724392,1.2914514248,0.7114310226,-0.378628523,1.6874077199,0.5099005694,-0.644163875,-1.341004456,0.6064281383,-0.820911644,1.1302273013,0.6248958507,0.7532799063,0.7572570467,0.9702594389,0.1699668565,-0.085888517,-0.129774625,-0.086632591,-0.043205876,6.9488048893,-2.291284786,-10.2529765,-2.06142196,-6.285593757,-11.51525453,-9.705402388,-2.595492495,0.952958503,4.4502052279,8.0790321905,-1.666388935,-9.499696596,-1.304164914,-5.315334318,-11.34528767,-9.791290904,-2.725267119,0.8663259118,4.4069993519 +050,3,7,48,367,Texas,Parker County,116927,116959,117324,118326,119494,119807,122185,125691,129016,133616,138254,143149,148198,365,1002,1168,313,2378,3506,3325,4600,4638,4895,5049,350,1262,1291,1317,1423,1435,1487,1482,1566,1565,1600,268,955,912,984,1026,1082,1056,1158,1172,1182,1320,82,307,379,333,397,353,431,324,394,383,280,22,29,25,30,107,87,101,104,78,82,70,257,668,773,-79,1859,3038,2786,4156,4159,4443,4729,279,697,798,-49,1966,3125,2887,4260,4237,4525,4799,4,-2,-9,29,15,28,7,16,7,-13,-30,3121,3121,3137,3110,1670,1161,1212,1202,1242,1241,1119,1114,10.710799915,10.856950635,11.007058057,11.760719363,11.57836983,11.676161236,11.28575345,11.520211866,11.122838065,10.983466451,8.1052408233,7.6696661341,8.223952261,8.479619161,8.7301715374,8.2918804744,8.818422736,8.6217677566,8.4007633181,9.0613598218,2.6055590919,3.1872845009,2.7831057956,3.2811002017,2.8481982927,3.3842807618,2.4673307137,2.8984441093,2.7220747469,1.9221066289,0.2461277318,0.210243041,0.2507302519,0.8843267546,0.7019638852,0.7930681136,0.7919826982,0.5738036562,0.5827940711,0.4805266572,5.6694249947,6.5007148263,-0.66025633,15.364144269,24.512256128,21.876116479,31.648847056,30.595505205,31.577488513,32.463008028,5.9155527265,6.7109578673,-0.409526078,16.248471024,25.214220013,22.669184592,32.440829754,31.169308861,32.160282584,32.943534685 +050,3,7,48,369,Texas,Parmer County,10269,10269,10266,10280,10188,9989,9954,9791,9764,9688,9666,9555,9522,-3,14,-92,-199,-35,-163,-27,-76,-22,-111,-33,29,152,151,150,158,153,181,150,147,130,135,38,86,71,79,57,84,79,69,87,50,37,-9,66,80,71,101,69,102,81,60,80,98,5,49,46,40,47,32,31,14,7,13,13,2,-99,-227,-319,-187,-269,-159,-173,-89,-204,-144,7,-50,-181,-279,-140,-237,-128,-159,-82,-191,-131,-1,-2,9,9,4,5,-1,2,0,0,0,73,73,73,68,73,77,74,67,67,68,64,64,14.796067361,14.754739105,14.868414531,15.845158702,15.497594328,18.511889542,15.422578655,15.190658262,13.526871651,14.153168737,8.3714591648,6.9376587844,7.8306983199,5.7162914306,8.5084831603,8.0797749936,7.0943861814,8.9903895835,5.2026429426,3.8790166169,6.4246081962,7.8170803205,7.0377162115,10.128867272,6.9891111674,10.432114549,8.3281924738,6.2002686783,8.3242287082,10.27415212,4.769784873,4.4948211843,3.9649105417,4.7134332849,3.2413269182,3.1705446177,1.4394406745,0.7233646791,1.3526871651,1.3628977303,-9.636912294,-22.18096541,-31.62016157,-18.75344732,-27.24740441,-16.26182562,-17.78737405,-9.197065206,-21.22678321,-15.09671332,-4.867127421,-17.68614423,-27.65525103,-14.04001404,-24.00607749,-13.091281,-16.34793337,-8.473700527,-19.87409604,-13.73381559 +050,3,7,48,371,Texas,Pecos County,15507,15507,15521,15638,15563,15656,15818,16022,15852,15626,15673,15757,15718,14,117,-75,93,162,204,-170,-226,47,84,-39,48,232,217,224,235,223,184,189,208,200,204,35,108,128,116,104,127,121,134,126,102,102,13,124,89,108,131,96,63,55,82,98,102,4,19,7,-3,-3,22,19,14,13,11,12,-1,-26,-170,-10,38,86,-253,-295,-48,-26,-153,3,-7,-163,-13,35,108,-234,-281,-35,-15,-141,-2,0,-1,-2,-4,0,1,0,0,1,0,2025,2025,2040,2055,2077,2095,2067,2043,2087,2082,2059,2056,14.891363651,13.909810583,14.350235434,14.932960539,14.007537688,11.54546025,12.00838681,13.291159462,12.726694241,12.962668785,6.9321865272,8.2048652287,7.4313719209,6.6086293449,7.9773869347,7.5923950555,8.5138827117,8.0513754433,6.490614063,6.4813343924,7.9591771238,5.7049453543,6.9188635126,8.324331194,6.0301507538,3.9530651942,3.4945040981,5.2397840187,6.2360801782,6.4813343924,1.2195513335,0.4487035672,-0.192190653,-0.190633539,1.3819095477,1.1921942649,0.8895101341,0.8306974664,0.6999681833,0.7625099285,-1.66885972,-10.89708663,-0.64063551,2.4146914914,5.4020100503,-15.87500784,-18.74324925,-3.067190645,-1.654470251,-9.722001589,-0.449308386,-10.44838306,-0.832826164,2.2240579526,6.783919598,-14.68281358,-17.85373912,-2.236493179,-0.954502068,-8.95949166 +050,3,7,48,373,Texas,Polk County,45413,45413,45444,45582,45517,45527,45815,46617,47654,48938,49933,51254,52995,31,138,-65,10,288,802,1037,1284,995,1321,1741,137,473,494,509,497,514,557,495,508,497,515,162,560,602,625,641,681,673,630,695,626,663,-25,-87,-108,-116,-144,-167,-116,-135,-187,-129,-148,14,60,72,111,129,144,113,103,82,93,66,36,162,-36,15,280,805,1032,1305,1091,1359,1838,50,222,36,126,409,949,1145,1408,1173,1452,1904,6,3,7,0,23,20,8,11,9,-2,-15,4241,4249,4272,4416,4397,4402,4378,4379,4335,4337,4233,4227,10.392635071,10.845344076,11.181406792,10.882179063,11.121689458,11.816995683,10.249296008,10.276016223,9.8233962861,9.8801906973,12.304176829,13.216390959,13.729625236,14.035164546,14.735156656,14.277985807,13.044558556,14.058722982,12.373130936,12.71954647,-1.911541757,-2.371046883,-2.548218444,-3.152985483,-3.613467198,-2.460990124,-2.795262548,-3.782706759,-2.54973465,-2.839355773,1.3183046602,1.580697922,2.4383814419,2.8245494953,3.1158040505,2.3973438279,2.1326817956,1.6587270281,1.838180794,1.2661991962,3.5594225826,-0.790348961,0.3295110057,6.1308051061,17.418210144,21.894325933,27.020871294,22.069160826,26.861158054,35.261729129,4.8777272428,0.790348961,2.7678924476,8.9553546014,20.534014194,24.291669761,29.153553089,23.727887854,28.699338848,36.527928325 +050,3,7,48,375,Texas,Potter County,121073,121037,121329,122268,122706,122091,122019,121214,120440,120008,118344,116818,116004,292,939,438,-615,-72,-805,-774,-432,-1664,-1526,-814,534,2039,2038,2126,2101,1995,1906,1823,1649,1619,1570,316,1131,1145,1187,1232,1225,1233,1159,1243,1163,1162,218,908,893,939,869,770,673,664,406,456,408,84,463,584,552,697,680,512,448,333,334,278,1,-430,-1050,-2141,-1658,-2277,-1964,-1549,-2413,-2313,-1491,85,33,-466,-1589,-961,-1597,-1452,-1101,-2080,-1979,-1213,-11,-2,11,35,20,22,5,5,10,-3,-9,6919,6937,6913,6840,6834,7098,6927,6951,6898,6625,6532,6521,16.740764459,16.638500412,17.369493907,17.213551268,16.404024125,15.774619911,15.163361725,13.836678526,13.769231423,13.486697992,9.2858286432,9.3479308008,9.6978312643,10.093810168,10.072646393,10.204672797,9.6403380357,10.429952339,9.8910538267,9.9818745651,7.4549358161,7.2905696115,7.6716626429,7.1197411003,6.3313777325,5.5699471145,5.5230236891,3.4067261865,3.8781775967,3.5048234273,3.8013604437,4.767852915,4.5098591895,5.7105403302,5.5913465689,4.2374634808,3.7263774288,2.794186749,2.8405949941,2.3880904725,-3.530421146,-8.572338289,-17.49204443,-13.58403998,-18.72278844,-16.25464507,-12.88428267,-20.24736524,-19.67154557,-12.80806797,0.2709392973,-3.804485374,-12.98218524,-7.873499652,-13.13144187,-12.01718159,-9.157905244,-17.45317849,-16.83095058,-10.41997749 +050,3,7,48,377,Texas,Presidio County,7818,7817,7875,7754,7614,7383,7189,7048,7113,7044,6764,6612,6508,58,-121,-140,-231,-194,-141,65,-69,-280,-152,-104,36,128,97,118,134,133,109,133,88,101,96,18,31,36,50,53,50,42,54,55,47,57,18,97,61,68,81,83,67,79,33,54,39,6,17,24,43,61,60,36,4,3,10,4,32,-235,-232,-351,-347,-288,-38,-152,-315,-216,-145,38,-218,-208,-308,-286,-228,-2,-148,-312,-206,-141,2,0,7,9,11,4,0,0,-1,0,-2,0,0,0,0,0,0,0,0,0,0,0,0,16.379806769,12.623633524,15.736480629,18.39143563,18.683711456,15.394393051,18.789291517,12.746234067,15.101674641,14.634146341,3.966984452,4.6850598647,6.6680002667,7.2742245402,7.0239516752,5.9317844785,7.6287349015,7.966396292,7.0275119617,8.6890243902,12.412822317,7.9385736596,9.0684803627,11.11721109,11.659759781,9.4626085728,11.160556615,4.7798377752,8.0741626794,5.9451219512,2.1754430866,3.1233732431,5.7344802294,8.3722206972,8.4287420103,5.0843866959,0.5650914742,0.4345307068,1.495215311,0.6097560976,-30.07230149,-30.19260802,-46.80936187,-47.62558331,-40.45796165,-5.366852623,-21.47347602,-45.62572422,-32.29665072,-22.10365854,-27.8968584,-27.06923477,-41.07488164,-39.25336261,-32.02921964,-0.282465928,-20.90838454,-45.19119351,-30.80143541,-21.49390244 +050,3,7,48,379,Texas,Rains County,10914,10902,10898,10990,10927,11020,11001,11121,11283,11713,12056,12401,12552,-4,92,-63,93,-19,120,162,430,343,345,151,22,104,98,116,81,101,86,104,127,133,121,40,113,115,134,145,149,165,151,165,131,143,-18,-9,-17,-18,-64,-48,-79,-47,-38,2,-22,1,6,13,11,11,10,11,6,5,7,7,12,96,-61,98,34,157,228,469,376,338,166,13,102,-48,109,45,167,239,475,381,345,173,1,-1,2,2,0,1,2,2,0,-2,0,66,66,66,74,68,69,66,55,58,63,63,63,9.5029239766,8.9428297668,10.570920855,7.356614141,9.1311816291,7.6772004999,9.0450513133,10.686187892,10.876231754,9.6982326774,10.325292398,10.494136971,12.21123616,13.169247536,13.470753096,14.729512587,13.132718734,13.883629938,10.712679396,11.46154771,-0.822368421,-1.551307204,-1.640315305,-5.812633395,-4.339571467,-7.052312087,-4.08766742,-3.197442046,0.1635523572,-1.763315032,0.548245614,1.1862937446,1.0024149086,0.9990463648,0.904077389,0.9819675058,0.5218298835,0.4207160587,0.5724332502,0.561054783,8.7719298246,-5.566455263,8.9306055497,3.0879614913,14.194015008,20.353508302,40.789702557,31.637847617,27.640348367,13.305013425,9.3201754386,-4.380161518,9.9330204584,4.0870078561,15.098092397,21.335475808,41.31153244,32.058563675,28.212781617,13.866068208 +050,3,7,48,381,Texas,Randall County,120725,120761,121221,123480,125047,126833,128823,130463,132465,134148,135745,137770,139899,460,2259,1567,1786,1990,1640,2002,1683,1597,2025,2129,381,1650,1568,1652,1729,1756,1656,1601,1613,1622,1645,266,910,933,1036,980,1066,1061,1015,1062,1142,1223,115,740,635,616,749,690,595,586,551,480,422,35,126,183,167,215,141,124,110,60,67,47,298,1387,749,992,1022,815,1282,993,987,1482,1667,333,1513,932,1159,1237,956,1406,1103,1047,1549,1714,12,6,0,11,4,-6,1,-6,-1,-4,-7,2000,2000,2049,2022,2298,2565,2567,2511,2329,2290,2386,2384,13.485845992,12.618347302,13.117357472,13.525988046,13.544888656,12.596604394,12.009916996,11.952885032,11.86040985,11.848639927,7.4376483954,7.5082385415,8.2261394315,7.6665519292,8.222580471,8.0706505203,7.614032324,7.8697854335,8.350547502,8.8090496238,6.0481975963,5.1101087608,4.8912180403,5.8594361173,5.3223081848,4.5259538733,4.3958846718,4.0830995987,3.5098623476,3.0395903036,1.0298282394,1.472677013,1.3260282674,1.6819476171,1.0876021073,0.9432240005,0.8251660647,0.444620646,0.489918286,0.3385325694,11.336283873,6.0275141132,7.8767667143,7.9951184404,6.2864944501,9.7517191018,7.4489991111,7.314009626,10.836699998,12.007101981,12.366112112,7.5001911261,9.2027949817,9.6770660575,7.3740965575,10.694943102,8.2741651757,7.758630272,11.326618284,12.34563455 +050,3,7,48,383,Texas,Reagan County,3367,3367,3353,3395,3477,3630,3784,3804,3721,3706,3728,3842,3833,-14,42,82,153,154,20,-83,-15,22,114,-9,13,46,42,67,69,49,74,78,56,61,67,2,17,25,38,24,25,37,26,24,21,17,11,29,17,29,45,24,37,52,32,40,50,1,3,0,26,31,36,43,48,39,40,33,-28,10,64,98,74,-40,-165,-115,-49,35,-92,-27,13,64,124,105,-4,-122,-67,-10,75,-59,2,0,1,0,4,0,2,0,0,-1,0,27,27,28,30,29,27,28,27,32,33,22,22,13.633669235,12.223515716,18.854650345,18.613434044,12.915129151,19.667774086,21.004443248,15.065913371,16.116248349,17.459283388,5.0385299348,7.2759022119,10.693682285,6.4742379282,6.5893516078,9.8338870432,7.0014810825,6.4568200161,5.5482166446,4.4299674267,8.5951393005,4.9476135041,8.1609680597,12.139196115,6.3257775435,9.8338870432,14.002962165,8.6090933549,10.568031704,13.029315961,0.8891523414,0,7.3167299845,8.362557324,9.4886663152,11.428571429,12.925811229,10.492332526,10.568031704,8.5993485342,2.9638411381,18.626309662,27.578443788,19.962233612,-10.54296257,-43.8538206,-30.9680894,-13.1826742,9.2470277411,-23.97394137,3.8529934795,18.626309662,34.895173772,28.324790936,-1.054296257,-32.42524917,-18.04227817,-2.690341673,19.815059445,-15.37459283 +050,3,7,48,385,Texas,Real County,3309,3309,3322,3432,3354,3320,3347,3297,3387,3413,3475,3460,3411,13,110,-78,-34,27,-50,90,26,62,-15,-49,8,27,43,30,27,42,30,44,31,36,39,5,45,60,69,51,41,44,63,55,45,63,3,-18,-17,-39,-24,1,-14,-19,-24,-9,-24,0,1,1,1,1,2,0,0,0,0,0,10,126,-62,5,48,-54,103,45,86,-6,-25,10,127,-61,6,49,-52,103,45,86,-6,-25,0,1,0,-1,2,1,1,0,0,0,0,70,70,70,70,72,72,72,71,71,71,71,71,7.9952620669,12.673150604,8.990110878,8.0995950202,12.642986153,8.9766606822,12.941176471,9.0011614402,10.382119683,11.35205938,13.325436778,17.683465959,20.677255019,15.299235038,12.341962673,13.165769001,18.529411765,15.969802555,12.977649603,18.337942075,-5.330174711,-5.010315355,-11.68714414,-7.199640018,0.3010234798,-4.189108318,-5.588235294,-6.968641115,-2.595529921,-6.985882695,0.2961208173,0.2947244327,0.2996703626,0.2999850007,0.6020469597,0,0,0,0,0,37.311222979,-18.27291482,1.498351813,14.399280036,-16.25526791,30.819868342,13.235294118,24.970963995,-1.73035328,-7.276961141,37.607343796,-17.97819039,1.7980221756,14.699265037,-15.65322095,30.819868342,13.235294118,24.970963995,-1.73035328,-7.276961141 +050,3,7,48,387,Texas,Red River County,12860,12862,12873,12681,12721,12484,12443,12344,12175,12167,12141,12095,11995,11,-192,40,-237,-41,-99,-169,-8,-26,-46,-100,33,134,124,143,157,107,112,131,123,113,118,23,192,177,194,181,180,162,193,181,167,206,10,-58,-53,-51,-24,-73,-50,-62,-58,-54,-88,-1,-2,-2,-2,-2,-4,-1,-1,0,-1,1,4,-132,93,-187,-12,-19,-119,57,33,9,-11,3,-134,91,-189,-14,-23,-120,56,33,8,-10,-2,0,2,3,-3,-3,1,-2,-1,0,-2,189,189,189,188,184,183,177,186,176,159,163,163,10.487594897,9.7630107866,11.346954969,12.596782605,8.6335579134,9.1357722582,10.763289787,10.120125062,9.3249711173,9.796596098,15.027001644,13.935910558,15.393771077,14.522405424,14.523742284,13.214242016,15.85736587,14.892216554,13.781152005,17.102532171,-4.539406746,-4.172899772,-4.046816108,-1.925622819,-5.890184371,-4.078469758,-5.094076082,-4.772091493,-4.456180888,-7.305936073,-0.156531267,-0.157467916,-0.158698671,-0.160468568,-0.322749829,-0.081569395,-0.082162517,0,-0.082521868,0.0830220008,-10.33106363,7.3222580899,-14.83832573,-0.962811409,-1.533061686,-9.706758024,4.6832634952,2.7151555044,0.7426968147,-0.913242009,-10.4875949,7.164790174,-14.9970244,-1.123279978,-1.855811514,-9.78832742,4.6011009777,2.7151555044,0.6601749464,-0.830220008 +050,3,7,48,389,Texas,Reeves County,13783,13783,13830,14095,14256,14478,15103,15556,15203,15141,15486,15951,15949,47,265,161,222,625,453,-353,-62,345,465,-2,41,166,153,173,200,211,205,188,198,179,192,11,94,93,125,118,105,111,108,124,103,115,30,72,60,48,82,106,94,80,74,76,77,9,41,53,66,94,85,82,62,45,54,39,9,150,50,107,428,257,-534,-206,225,335,-119,18,191,103,173,522,342,-452,-144,270,389,-80,-1,2,-2,1,21,5,5,2,1,0,1,3110,3123,3411,3418,3421,3716,3802,3333,3139,3138,3138,3137,11.888988362,10.793270079,12.041483956,13.5221933,13.764310643,13.329432036,12.391247034,12.929767852,11.387855075,12.037617555,6.7323187108,6.5606151459,8.7004941881,7.9780940469,6.8495384716,7.2173997854,7.1183759557,8.0974303719,6.5527881159,7.210031348,5.1566696509,4.2326549328,3.3409897682,5.5440992529,6.9147721713,6.1120322507,5.2728710783,4.83233748,4.8350669593,4.8275862069,2.9364368845,3.7388451906,4.5938609313,6.3554308509,5.544864477,5.3317728145,4.0864750857,2.9385836027,3.4354423132,2.4451410658,10.743061773,3.527212444,7.447623025,28.937493661,16.76506083,-34.72154491,-13.57764303,14.692918014,21.312466202,-7.460815047,13.679498657,7.2660576347,12.041483956,35.292924512,22.309925307,-29.3897721,-9.491167941,17.631501616,24.747908515,-5.015673981 +050,3,7,48,391,Texas,Refugio County,7383,7383,7376,7323,7259,7283,7366,7331,7275,7178,6921,6824,6877,-7,-53,-64,24,83,-35,-56,-97,-257,-97,53,22,89,86,83,87,101,96,85,85,48,59,8,105,99,94,98,108,104,88,96,44,43,14,-16,-13,-11,-11,-7,-8,-3,-11,4,16,0,2,10,7,7,7,4,3,5,2,2,-21,-39,-64,30,87,-36,-53,-96,-251,-103,35,-21,-37,-54,37,94,-29,-49,-93,-246,-101,37,0,0,3,-2,0,1,1,-1,0,0,0,129,129,128,128,125,128,119,126,129,129,121,121,12.109667324,11.795364148,11.415211113,11.877943887,13.744301558,13.145282761,11.76226389,12.057592737,6.9843579483,8.6125100358,14.286686169,13.578384309,12.928070417,13.379752884,14.696876914,14.240722991,12.177402615,13.617987091,6.4023281193,6.2769140939,-2.177018845,-1.783020162,-1.512859304,-1.501808997,-0.952575356,-1.09544023,-0.415138726,-1.560394354,0.582029829,2.3355959419,0.2721273556,1.3715539706,0.9627286481,0.9556966346,0.9525753555,0.547720115,0.4151387255,0.709270161,0.2910149145,0.2919494927,-5.306483434,-8.777945412,4.1259799202,11.877943887,-4.898958971,-7.257291524,-13.28443922,-35.60536208,-14.9872681,5.1091161229,-5.034356079,-7.406391442,5.0887085683,12.833640522,-3.946383616,-6.709571409,-12.86930049,-34.89609192,-14.69625318,5.4010656156 +050,3,7,48,393,Texas,Roberts County,929,925,920,922,938,915,910,906,910,937,889,837,813,-5,2,16,-23,-5,-4,4,27,-48,-52,-24,4,11,10,8,10,6,12,15,5,6,6,4,7,6,15,12,8,7,6,13,9,10,0,4,4,-7,-2,-2,5,9,-8,-3,-4,0,0,0,0,0,0,0,0,0,0,0,-6,-3,14,-18,-3,0,-2,19,-41,-50,-19,-6,-3,14,-18,-3,0,-2,19,-41,-50,-19,1,1,-2,2,0,-2,1,-1,1,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,11.943539631,10.752688172,8.6346465192,10.95890411,6.6079295154,13.215859031,16.242555495,5.4764512596,6.9524913094,7.2727272727,7.6004343105,6.4516129032,16.189962223,13.150684932,8.8105726872,7.7092511013,6.4970221982,14.238773275,10.428736964,12.121212121,4.3431053203,4.3010752688,-7.555315704,-2.191780822,-2.202643172,5.5066079295,9.7455332972,-8.762322015,-3.476245655,-4.848484848,0,0,0,0,0,0,0,0,0,0,-3.25732899,15.053763441,-19.42795467,-3.287671233,0,-2.202643172,20.573903628,-44.90690033,-57.93742758,-23.03030303,-3.25732899,15.053763441,-19.42795467,-3.287671233,0,-2.202643172,20.573903628,-44.90690033,-57.93742758,-23.03030303 +050,3,7,48,395,Texas,Robertson County,16622,16617,16551,16652,16447,16420,16457,16688,16821,17152,17237,17104,17155,-66,101,-205,-27,37,231,133,331,85,-133,51,43,211,204,212,202,213,232,215,199,209,199,74,185,188,167,201,195,205,189,193,175,186,-31,26,16,45,1,18,27,26,6,34,13,-1,-1,3,17,23,23,24,27,19,20,14,-34,78,-229,-87,17,188,83,278,61,-187,26,-35,77,-226,-70,40,211,107,305,80,-167,40,0,-2,5,-2,-4,2,-1,0,-1,0,-2,193,193,189,177,173,181,194,196,198,182,173,174,12.709694907,12.326656394,12.900477683,12.288225811,12.852617288,13.847026172,12.657110058,11.57346826,12.172039253,11.617385213,11.143571364,11.359859814,10.162168741,12.22739301,11.766480615,12.235518816,11.126482795,11.224519468,10.191898896,10.858460551,1.5661235431,0.96679658,2.7383089421,0.060832801,1.0861366722,1.6115073562,1.5306272628,0.3489487918,1.980140357,0.7589246621,-0.060235521,0.1812743587,1.034472267,1.3991544241,1.3878413034,1.4324509833,1.5894975422,1.1050045073,1.1647884453,0.8173034823,4.6983706292,-13.83727605,-5.294063955,1.0341576178,11.344094132,4.953892984,16.365937656,3.5476460496,-10.89077196,1.5178493243,4.6381351083,-13.65600169,-4.259591688,2.4333120419,12.731935435,6.3863439673,17.955435199,4.6526505569,-9.725983518,2.3351528066 +050,3,7,48,397,Texas,Rockwall County,78337,78398,78971,81103,82772,84732,87138,90258,93579,96956,100592,104862,109888,573,2132,1669,1960,2406,3120,3321,3377,3636,4270,5026,216,961,994,952,1026,928,1088,1037,1055,1085,1150,114,435,531,507,564,541,548,573,670,642,689,102,526,463,445,462,387,540,464,385,443,461,26,110,70,43,130,162,151,132,96,77,77,419,1486,1121,1457,1779,2543,2620,2777,3152,3763,4522,445,1596,1191,1500,1909,2705,2771,2909,3248,3840,4599,26,10,15,15,35,28,10,4,3,-13,-34,659,659,665,658,692,701,705,679,694,725,625,625,12.006946787,12.131197559,11.366892731,11.939256415,10.46246815,11.836572616,10.885139213,10.680948428,10.561974943,10.710128056,5.4349863188,6.4805491991,6.05358678,6.5631000175,6.0993483506,5.9618031191,6.014642979,6.7831615607,6.2495741139,6.4167636787,6.5719604683,5.65064836,5.3133059509,5.3761563973,4.3631197998,5.8747694969,4.8704962343,3.897786867,4.3124008294,4.2933643772,1.3743643565,0.8543096873,0.513420575,1.5127712806,1.8264222418,1.6427596186,1.3855722046,0.9719156863,0.7495595121,0.717112922,18.566413034,13.68115942,17.396599484,20.70169314,28.670319511,28.503511263,29.149500092,31.911231701,36.631070702,42.114086147,19.94077739,14.535469108,17.910020059,22.214464421,30.496741753,30.146270881,30.535072296,32.883147387,37.380630214,42.831199069 +050,3,7,48,399,Texas,Runnels County,10501,10502,10510,10503,10337,10197,10297,10387,10290,10275,10167,10265,10401,8,-7,-166,-140,100,90,-97,-15,-108,98,136,35,128,110,97,101,91,124,106,110,113,116,47,139,144,144,136,134,134,153,138,106,121,-12,-11,-34,-47,-35,-43,-10,-47,-28,7,-5,0,11,10,5,18,15,7,3,2,4,2,20,-6,-143,-100,118,118,-94,29,-83,89,140,20,5,-133,-95,136,133,-87,32,-81,93,142,0,-1,1,2,-1,0,0,0,1,-2,-1,194,194,194,194,186,183,188,178,184,183,165,165,12.182934374,10.556621881,9.4477452031,9.8565433785,8.7990717463,11.994002999,10.308777048,10.762156345,11.061080658,11.226168586,13.229905297,13.819577735,14.025518652,13.272177223,12.956874879,12.961261305,14.879649891,13.501614323,10.375880971,11.710055163,-1.046970923,-3.262955854,-4.577773449,-3.415633844,-4.157803133,-0.967258306,-4.570872842,-2.739457979,0.6851996868,-0.483886577,1.0469709228,0.9596928983,0.4869971754,1.7566116912,1.4503964417,0.6770808144,0.291757841,0.1956755699,0.3915426782,0.1935546308,-0.571075049,-13.72360845,-9.739943508,11.515565531,11.409785341,-9.09222808,2.8203257963,-8.120536151,8.7118245889,13.548824156,0.475895874,-12.76391555,-9.252946333,13.272177223,12.860181783,-8.415147265,3.1120836372,-7.924860581,9.103367267,13.742378786 +050,3,7,48,401,Texas,Rusk County,53330,53255,53307,53644,53735,53269,53144,52897,52836,54148,54246,54386,54324,52,337,91,-466,-125,-247,-61,1312,98,140,-62,147,693,666,693,594,584,633,603,548,580,556,113,568,507,595,531,554,546,540,552,546,623,34,125,159,98,63,30,87,63,-4,34,-67,5,22,10,-22,30,18,14,-3,-14,-8,-8,20,189,-71,-554,-213,-292,-159,1238,118,115,10,25,211,-61,-576,-183,-274,-145,1235,104,107,2,-7,1,-7,12,-5,-3,-3,14,-2,-1,3,5210,5212,5184,4992,4885,4829,4802,4838,6208,6211,6188,6179,12.959205618,12.404660129,12.952786812,11.164049505,11.014607557,11.973556033,11.272713677,10.111260771,10.678253185,10.229049765,10.621686567,9.4431872154,11.121079586,9.9799836486,10.448788676,10.327901412,10.094967472,10.185065594,10.052286619,11.461687057,2.3375190508,2.9614729137,1.8317072259,1.1840658566,0.5658188814,1.6456546206,1.177746205,-0.073804823,0.625966566,-1.232637292,0.4114033529,0.1862561581,-0.411199581,0.5638408841,0.3394913288,0.2648179849,-0.056083153,-0.258316881,-0.147286251,-0.147180572,3.5343288048,-1.322418722,-10.35475309,-4.003270277,-5.507303779,-3.007575686,23.143647648,2.1772422828,2.1172398557,0.1839757152,3.9457321577,-1.136162564,-10.76595267,-3.439429393,-5.16781245,-2.742757701,23.087564496,1.9189254018,1.9699536048,0.036795143 +050,3,7,48,403,Texas,Sabine County,10834,10836,10870,10727,10526,10428,10435,10451,10389,10422,10541,10490,10507,34,-143,-201,-98,7,16,-62,33,119,-51,17,22,92,93,73,96,91,108,105,97,103,97,23,177,155,183,175,181,176,193,164,141,153,-1,-85,-62,-110,-79,-90,-68,-88,-67,-38,-56,0,-1,-1,0,-2,-2,-4,-6,-6,-6,-4,32,-56,-139,14,87,108,11,126,190,-5,77,32,-57,-140,14,85,106,7,120,184,-11,73,3,-1,1,-2,1,0,-1,1,2,-2,0,79,79,78,78,79,101,117,101,130,136,108,111,8.5197018104,8.7517056416,6.9676434094,9.2028950774,8.7139710811,10.364683301,10.090817356,9.2544006106,9.7950644287,9.2394151545,16.39116544,14.586176069,17.466832108,16.776110818,17.332184238,16.89059501,18.547883331,15.646615465,13.408777519,14.573510502,-7.871463629,-5.834470428,-10.4991887,-7.573215741,-8.618213157,-6.525911708,-8.457065975,-6.392214855,-3.61371309,-5.334095347,-0.092605454,-0.094104362,0,-0.191726981,-0.191515848,-0.383877159,-0.576618135,-0.572437151,-0.570586277,-0.38100681,-5.18590545,-13.08050628,1.3362603799,8.3401236639,10.341855789,1.0556621881,12.108980827,18.127176454,-0.475488565,7.3343811021,-5.278510904,-13.17461064,1.3362603799,8.1483966831,10.150339941,0.6717850288,11.532362693,17.554739303,-1.046074842,6.9533742916 +050,3,7,48,405,Texas,San Augustine County,8865,8861,8855,8798,8789,8661,8479,8346,8280,8302,8251,8220,8248,-6,-57,-9,-128,-182,-133,-66,22,-51,-31,28,24,92,119,104,82,105,78,88,78,75,72,17,183,135,136,130,141,141,107,141,119,151,7,-91,-16,-32,-48,-36,-63,-19,-63,-44,-79,-1,0,0,0,1,2,3,1,1,2,3,-11,34,8,-96,-137,-98,-5,40,11,11,105,-12,34,8,-96,-136,-96,-2,41,12,13,108,-1,0,-1,0,2,-1,-1,0,0,0,-1,223,223,203,223,215,215,179,191,181,201,183,182,10.423157537,13.532723034,11.919770774,9.5682613769,12.481426449,9.382894262,10.613918707,9.4242735456,9.1069151843,8.7442312363,20.733019883,15.35224882,15.58739255,15.169194866,16.76077266,16.961385781,12.905560246,17.036186794,14.449638759,18.338596065,-10.30986235,-1.819525786,-3.667621777,-5.600933489,-4.279346211,-7.578491519,-2.291641539,-7.611913248,-5.342723575,-9.594364829,0,0,0,0.1166861144,0.2377414562,0.3608805485,0.1206127126,0.1208240198,0.2428510716,0.3643429682,3.8520364811,0.909762893,-11.00286533,-15.98599767,-11.64933135,-0.601467581,4.8245085032,1.329064218,1.3356808937,12.752003886,3.8520364811,0.909762893,-11.00286533,-15.86931155,-11.4115899,-0.240587032,4.9451212158,1.4498882378,1.5785319653,13.116346855 +050,3,7,48,407,Texas,San Jacinto County,26384,26383,26480,26789,26956,26745,27066,27376,27743,28233,28724,28867,29301,97,309,167,-211,321,310,367,490,491,143,434,77,255,272,278,296,277,293,299,292,287,277,45,282,275,296,280,301,342,324,324,297,346,32,-27,-3,-18,16,-24,-49,-25,-32,-10,-69,0,-9,-15,-14,-16,-12,-16,-17,-17,-17,-12,64,344,187,-173,320,344,430,528,540,169,520,64,335,172,-187,304,332,414,511,523,152,508,1,1,-2,-6,1,2,2,4,0,1,-5,128,128,128,133,127,129,128,127,127,127,127,127,9.5740486962,10.121871802,10.3536247,11.001468101,10.175967084,10.631542662,10.683149921,10.253349018,9.9668350958,9.5241369825,10.587771499,10.233510094,11.024003277,10.40679415,11.057639323,12.409513961,11.576389881,11.377003705,10.31411158,11.896575437,-1.013722803,-0.111638292,-0.670378578,0.5946739514,-0.881672238,-1.777971298,-0.89323996,-1.123654687,-0.347276484,-2.372438454,-0.337907601,-0.55819146,-0.52140556,-0.594673951,-0.440836119,-0.580562057,-0.607403173,-0.596941552,-0.590370023,-0.412597992,12.915579418,6.9587868639,-6.443082997,11.893479028,12.637302083,15.602605272,18.865227955,18.961672841,5.8689725825,17.879246321,12.577671817,6.4005954042,-6.964488557,11.298805077,12.196465964,15.022043216,18.257824782,18.364731289,5.2786025594,17.466648329 +050,3,7,48,409,Texas,San Patricio County,64804,64792,64424,64455,65261,66132,66654,67121,67325,67221,66576,66656,67069,-368,31,806,871,522,467,204,-104,-645,80,413,212,900,924,973,985,1047,1030,987,944,931,917,198,591,614,626,635,574,639,649,648,578,598,14,309,310,347,350,473,391,338,296,353,319,14,28,37,47,70,76,85,61,46,55,48,-426,-306,458,476,116,-76,-271,-502,-991,-328,41,-412,-278,495,523,186,0,-186,-441,-945,-273,89,30,0,1,1,-14,-6,-1,-1,4,0,5,680,680,680,675,678,656,655,607,617,498,484,483,13.966588816,14.246507755,14.810530241,14.835901375,15.653148944,15.322136769,14.671562142,14.110929244,13.975621472,13.71471303,9.1713933224,9.4668352401,9.5286659107,9.5642612926,8.5815735377,9.5056751409,9.6472581868,9.6863158367,8.6765942116,8.9437277996,4.7951954934,4.7796725153,5.2818643307,5.2716400825,7.0715754065,5.8164616277,5.0243039555,4.4246134069,5.2990272607,4.7709852309,0.4345160965,0.5704770422,0.7154110189,1.0543280165,1.1362362175,1.2644481799,0.9067530807,0.6876088403,0.8256274769,0.7178911946,-4.748640197,7.061580684,7.2454392548,1.7471721416,-1.136236218,-4.031358315,-7.46213191,-14.8134861,-4.923742044,0.6131987287,-4.314124101,7.6320577261,7.9608502736,2.8015001581,0,-2.766910135,-6.55537883,-14.12587726,-4.098114567,1.3310899234 +050,3,7,48,411,Texas,San Saba County,6131,6130,6134,6046,5990,5959,5860,5925,5920,5994,6056,6009,6039,4,-88,-56,-31,-99,65,-5,74,62,-47,30,11,60,81,64,67,64,62,56,67,70,70,27,65,69,78,56,57,67,84,65,75,82,-16,-5,12,-14,11,7,-5,-28,2,-5,-12,1,1,4,7,9,11,10,7,4,3,5,17,-84,-72,-22,-122,47,-11,95,56,-45,37,18,-83,-68,-15,-113,58,-1,102,60,-42,42,2,0,0,-2,3,0,1,0,0,0,0,684,684,684,677,669,669,669,680,697,720,689,689,9.8522167488,13.459621137,10.712193489,11.337676622,10.861264319,10.468552132,9.4007050529,11.12033195,11.603812681,11.620185923,10.673234811,11.46560319,13.055485815,9.4762670277,9.6733135342,11.312790207,14.101057579,10.788381743,12.432656444,13.612217795,-0.821018062,1.9940179462,-2.343292326,1.8614095947,1.1879507849,-0.844238075,-4.700352526,0.3319502075,-0.828843763,-1.992031873,0.1642036125,0.6646726487,1.1716461629,1.5229714866,1.8667798048,1.6884761503,1.1750881316,0.6639004149,0.4973062578,0.8300132802,-13.79310345,-11.96410768,-3.682316512,-20.6447246,7.9762409843,-1.857323765,15.947624643,9.2946058091,-7.459593867,6.1420982736,-13.62889984,-11.29943503,-2.510670349,-19.12175311,9.8430207891,-0.168847615,17.122712775,9.9585062241,-6.962287609,6.9721115538 +050,3,7,48,413,Texas,Schleicher County,3461,3461,3503,3309,3257,3188,3160,3191,3056,2988,2883,2801,2761,42,-194,-52,-69,-28,31,-135,-68,-105,-82,-40,8,41,31,43,45,24,29,24,23,25,24,2,21,25,29,32,23,26,22,33,29,19,6,20,6,14,13,1,3,2,-10,-4,5,-1,1,-4,-4,-1,0,1,1,1,1,1,34,-215,-56,-79,-41,30,-139,-72,-95,-79,-46,33,-214,-60,-83,-42,30,-138,-71,-94,-78,-45,3,0,2,0,1,0,0,1,-1,0,0,0,0,1,1,0,3,3,1,1,1,1,1,12.03758074,9.4425830034,13.343677269,14.177693762,7.5578649032,9.2844565391,7.9417604236,7.835121785,8.7966220971,8.6299892125,6.1655901351,7.614986293,8.9992242048,10.081915564,7.2429538655,8.3239955178,7.2799470549,11.241696474,10.204081633,6.8320747932,5.8719906048,1.8275967103,4.3444530644,4.0957781979,0.3149110376,0.9604610213,0.6618133686,-3.406574689,-1.407459536,1.7979144193,0.2935995302,-1.218397807,-1.241272304,-0.315059861,0,0.3201536738,0.3309066843,0.3406574689,0.3518648839,0.3595828839,-63.123899,-17.0575693,-24.51512801,-12.91745432,9.447331129,-44.50136065,-23.82528127,-32.36245955,-27.79732583,-16.54081266,-62.83029947,-18.2759671,-25.75640031,-13.23251418,9.447331129,-44.18120698,-23.49437459,-32.02180208,-27.44546094,-16.18122977 +050,3,7,48,415,Texas,Scurry County,16921,16919,16929,16861,17120,17258,17367,17565,17417,17020,16838,16655,16662,10,-68,259,138,109,198,-148,-397,-182,-183,7,60,272,250,251,269,226,266,224,213,200,199,53,167,192,158,187,165,173,155,176,184,188,7,105,58,93,82,61,93,69,37,16,11,-1,0,3,6,8,21,28,21,16,12,15,6,-173,194,39,19,119,-271,-491,-235,-211,-19,5,-173,197,45,27,140,-243,-470,-219,-199,-4,-2,0,4,0,0,-3,2,4,0,0,0,1724,1724,1662,1688,1646,1699,1678,1705,1694,1660,1597,1594,16.099437703,14.714104941,14.602361976,15.537906137,12.939425169,15.207821165,13.009263292,12.58195995,11.942794017,11.945853468,9.8845812371,11.300432595,9.1919250684,10.801444043,9.4469254552,9.8908009834,9.0019455818,10.396361274,10.987370495,11.28552991,6.2148564664,3.4136723463,5.4104369073,4.7364620939,3.4924997137,5.3170201818,4.0073177106,2.1855986768,0.9554235213,0.6603235585,0,0.1765692593,0.3490604456,0.4620938628,1.202335967,1.6008232805,1.2196184337,0.9451237521,0.716567641,0.9004412162,-10.23971589,11.418145434,2.2688928966,1.0974729242,6.8132371465,-15.49368247,-28.51584052,-13.88150511,-12.59964769,-1.140558874,-10.23971589,11.594714694,2.6179533423,1.559566787,8.0155731135,-13.89285918,-27.29622209,-12.93638136,-11.88308005,-0.240117658 +050,3,7,48,417,Texas,Shackelford County,3378,3376,3384,3335,3361,3374,3314,3331,3337,3289,3258,3272,3300,8,-49,26,13,-60,17,6,-48,-31,14,28,11,25,33,41,22,37,39,27,38,30,34,2,30,28,29,47,29,30,32,31,30,40,9,-5,5,12,-25,8,9,-5,7,0,-6,0,2,3,3,0,0,0,0,0,0,0,-2,-46,19,-2,-34,7,-3,-44,-39,15,34,-2,-44,22,1,-34,7,-3,-44,-39,15,34,1,0,-1,0,-1,2,0,1,1,-1,0,36,36,11,11,11,11,11,11,11,11,11,11,7.441583569,9.8566308244,12.175204157,6.5789473684,11.136192626,11.697660468,8.1497132508,11.608370246,9.1883614089,10.346926354,8.9299002828,8.3632019116,8.6117297699,14.055023923,8.7283671934,8.9982003599,9.6589194084,9.4699862532,9.1883614089,12.172854534,-1.488316714,1.4934289128,3.5634743875,-7.476076555,2.4078254327,2.699460108,-1.509206158,2.1383839927,0,-1.82592818,0.5953266855,0.8960573477,0.8908685969,0,0,0,0,0,0,0,-13.69251377,5.6750298686,-0.593912398,-10.16746411,2.1068472536,-0.899820036,-13.28101419,-11.91385367,4.5941807044,10.346926354,-13.09718708,6.5710872162,0.296956199,-10.16746411,2.1068472536,-0.899820036,-13.28101419,-11.91385367,4.5941807044,10.346926354 +050,3,7,48,419,Texas,Shelby County,25448,25450,25460,25736,26062,25977,25604,25366,25583,25218,25300,25297,24915,10,276,326,-85,-373,-238,217,-365,82,-3,-382,89,354,334,380,384,355,412,362,337,340,340,55,287,267,270,322,308,272,305,306,276,340,34,67,67,110,62,47,140,57,31,64,0,4,22,33,46,8,-7,1,-7,-6,-15,-2,-25,187,223,-243,-451,-278,77,-417,58,-52,-378,-21,209,256,-197,-443,-285,78,-424,52,-67,-380,-3,0,3,2,8,0,-1,2,-1,0,-2,172,172,178,173,168,152,153,150,158,154,145,145,13.829205407,12.89625082,14.604431292,14.889203389,13.929762605,16.173035781,14.251687959,13.341779168,13.439531988,13.542579463,11.211813423,10.309278351,10.37683276,12.485217425,12.085540514,10.677344011,12.007637645,12.114493844,10.909737731,13.542579463,2.6173919837,2.58697247,4.2275985319,2.4039859638,1.8442220914,5.4956917702,2.244050314,1.227285324,2.5297942566,0,0.8594421439,1.2741804703,1.7679048406,0.3101917373,-0.274671375,0.0392549412,-0.275585126,-0.237539095,-0.592920529,-0.079662232,7.3052582233,8.6103710568,-9.339149484,-17.48705919,-10.90837748,3.0226304736,-16.41699967,2.2962112514,-2.055457833,-15.05616187,8.1647003672,9.8845515271,-7.571244643,-17.17686745,-11.18304885,3.0618854148,-16.69258479,2.0586721565,-2.648378362,-15.13582411 +050,3,7,48,421,Texas,Sherman County,3034,3034,3025,3013,3037,3067,3061,3053,3053,3038,3094,3017,3027,-9,-12,24,30,-6,-8,0,-15,56,-77,10,5,35,48,35,40,41,28,43,43,42,42,8,26,32,24,42,31,26,24,25,17,13,-3,9,16,11,-2,10,2,19,18,25,29,0,3,5,5,2,7,6,6,5,6,5,-7,-25,2,15,-7,-25,-8,-41,34,-108,-23,-7,-22,7,20,-5,-18,-2,-35,39,-102,-18,1,1,1,-1,1,0,0,1,-1,0,-1,31,31,34,31,30,26,29,29,29,29,27,27,11.593242796,15.867768595,11.467889908,13.054830287,13.411841675,9.1713069112,14.119192251,14.024787997,13.745704467,13.898080741,8.6121232196,10.578512397,7.8636959371,13.707571802,10.140660779,8.5162135604,7.8804793958,8.1539465101,5.5637375225,4.3017868961,2.981119576,5.2892561983,3.6041939712,-0.652741514,3.2711808963,0.6550933508,6.238712855,5.8708414873,8.1819669449,9.5962938451,0.9937065253,1.652892562,1.6382699869,0.6527415144,2.2898266274,1.9652800524,1.970119849,1.630789302,1.9636720668,1.6545334216,-8.280887711,0.6611570248,4.9148099607,-2.2845953,-8.177952241,-2.620373403,-13.46248563,11.089367254,-35.3460972,-7.610853739,-7.287181186,2.3140495868,6.5530799476,-1.631853786,-5.888125613,-0.655093351,-11.49236579,12.720156556,-33.38242514,-5.956320318 +050,3,7,48,423,Texas,Smith County,209714,209729,210407,212770,214824,216498,219678,222450,225181,227159,229860,232916,235806,678,2363,2054,1674,3180,2772,2731,1978,2701,3056,2890,724,2985,2973,3007,3187,3120,3138,3114,3010,2899,2921,437,1943,1951,1967,2038,2050,2079,2103,2176,2185,2312,287,1042,1022,1040,1149,1070,1059,1011,834,714,609,24,295,240,303,364,306,200,158,103,92,76,365,1030,809,356,1645,1405,1476,819,1766,2251,2207,389,1325,1049,659,2009,1711,1676,977,1869,2343,2283,2,-4,-17,-25,22,-9,-4,-10,-2,-1,-2,4127,4128,3967,4076,4196,5000,4995,5041,4944,5132,5181,5181,14.107572009,13.905714299,13.943179342,14.613367081,14.113559874,14.020476687,13.768404298,13.172318875,12.528739606,12.46367783,9.1829187314,9.1254788421,9.1207960642,9.3448516195,9.2733326096,9.2889009028,9.2983154264,9.522580024,9.4430134666,9.86512261,4.9246532775,4.780235457,4.8223832775,5.2685154616,4.8402272645,4.7315757845,4.4700888712,3.6497388511,3.0857261396,2.5985552204,1.3942156592,1.1225601856,1.4049828203,1.6690510253,1.3842145261,0.8935931604,0.6985895565,0.4507471243,0.397600567,0.3242860374,4.8679394201,3.7839632923,1.6507388911,7.5428267488,6.3556255202,6.594717524,3.6211699164,7.7283438982,9.7282486559,9.4170958479,6.2621550793,4.9065234779,3.0557217114,9.2118777741,7.7398400463,7.4883106845,4.319759473,8.1790910225,10.125849223,9.7413818852 +050,3,7,48,425,Texas,Somervell County,8490,8491,8501,8428,8555,8567,8559,8619,8663,8850,9017,9123,9139,10,-73,127,12,-8,60,44,187,167,106,16,19,78,96,85,84,82,75,95,73,101,90,21,75,80,81,94,86,88,83,98,105,124,-2,3,16,4,-10,-4,-13,12,-25,-4,-34,5,8,3,-3,-2,-1,-3,-3,-3,-3,-2,7,-83,107,11,6,65,60,177,195,113,50,12,-75,110,8,4,64,57,174,192,110,48,0,-1,1,0,-2,0,0,1,0,0,2,287,287,291,298,296,291,287,284,283,282,286,286,9.2149565834,11.30542307,9.9287466417,9.809646152,9.5470951217,8.6795509779,10.849083538,8.1714893379,11.135611907,9.8565326908,8.8605351763,9.4211858918,9.4615115057,10.97746117,10.012807079,10.184006481,9.4786729858,10.969944591,11.57662624,13.580111707,0.3544214071,1.8842371784,0.4672351361,-1.167815018,-0.465711957,-1.504455503,1.3704105522,-2.798455253,-0.441014333,-3.723579017,0.9451237521,0.3532944709,-0.350426352,-0.233563004,-0.116427989,-0.347182039,-0.342602638,-0.33581463,-0.33076075,-0.21903406,-9.805658928,12.60083613,1.2848966242,0.7006890109,7.5678193038,6.9436407823,20.213555644,21.827950971,12.458654906,5.4758514949,-8.860535176,12.954130601,0.9344702722,0.4671260072,7.4513913145,6.5964587432,19.870953006,21.492136341,12.127894157,5.2568174351 +050,3,7,48,427,Texas,Starr County,60968,60982,61140,61640,61951,62347,62901,63406,63697,63887,64017,64294,64266,158,500,311,396,554,505,291,190,130,277,-28,325,1447,1323,1360,1383,1337,1229,1289,1208,1119,1156,107,390,366,377,376,389,369,475,401,404,401,218,1057,957,983,1007,948,860,814,807,715,755,-20,110,169,56,84,108,67,-53,-81,-52,-40,-38,-670,-827,-650,-543,-554,-636,-574,-597,-389,-740,-58,-560,-658,-594,-459,-446,-569,-627,-678,-441,-780,-2,3,12,7,6,3,0,3,1,3,-3,810,811,809,807,826,823,841,844,835,832,819,818,23.570614107,21.409325922,21.882894335,22.084184977,21.17063979,19.338646609,20.20629546,18.889166875,17.441996399,17.983820784,6.3528261932,5.9227613661,6.0660670325,6.0040878896,6.1595952718,5.8063145638,7.4460747429,6.2703277458,6.2971997724,6.2383322962,17.217787913,15.486564556,15.816827302,16.080097087,15.011044519,13.532332046,12.760220717,12.618839129,11.144796627,11.745488488,1.7918227724,2.7348269696,0.901060355,1.3413387839,1.7101189958,1.054263078,-0.830825182,-1.266574931,-0.810530664,-0.622277536,-10.91382961,-13.3828515,-10.45873626,-8.670797138,-8.772277071,-10.00763161,-8.997993479,-9.335126345,-6.06339285,-11.51213441,-9.122006842,-10.64802453,-9.557675908,-7.329458355,-7.062158075,-8.953368528,-9.828818661,-10.60170128,-6.873923514,-12.13441195 +050,3,7,48,429,Texas,Stephens County,9630,9634,9620,9535,9608,9366,9335,9378,9383,9288,9419,9364,9334,-14,-85,73,-242,-31,43,5,-95,131,-55,-30,33,104,99,100,109,93,113,94,108,96,105,14,149,104,126,103,105,125,106,116,93,98,19,-45,-5,-26,6,-12,-12,-12,-8,3,7,1,6,4,-4,-6,-4,-2,-2,-1,-1,0,-36,-45,71,-216,-31,57,20,-81,139,-56,-37,-35,-39,75,-220,-37,53,18,-83,138,-57,-37,2,-1,3,4,0,2,-1,0,1,-1,0,591,591,587,715,692,646,680,694,687,676,668,668,10.858783607,10.343206394,10.54073996,11.657130635,9.939614172,12.046266191,10.069091104,11.546479927,10.222009264,11.231147716,15.557295745,10.865590555,13.28133235,11.015453719,11.222145033,13.325515697,11.354506989,12.401774737,9.9025714742,10.482404535,-4.698512138,-0.522384161,-2.74059239,0.6416769157,-1.282530861,-1.279249507,-1.285415886,-0.855294809,0.3194377895,0.7487431811,0.626468285,0.417907329,-0.421629598,-0.641676916,-0.427510287,-0.213208251,-0.214235981,-0.106911851,-0.106479263,0,-4.698512138,7.4178550906,-22.76799831,-3.315330731,6.0920215893,2.1320825116,-8.676557228,14.860747314,-5.962838737,-3.957642529,-4.072043853,7.8357624197,-23.18962791,-3.957007647,5.6645113023,1.9188742604,-8.890793209,14.753835463,-6.069318,-3.957642529 +050,3,7,48,431,Texas,Sterling County,1143,1143,1137,1170,1190,1228,1339,1330,1337,1285,1306,1295,1315,-6,33,20,38,111,-9,7,-52,21,-11,20,4,12,10,14,19,12,19,19,14,14,12,7,13,16,11,13,9,15,10,12,27,30,-3,-1,-6,3,6,3,4,9,2,-13,-18,0,2,4,1,3,0,0,0,0,0,0,-4,32,22,35,99,-12,4,-63,20,1,40,-4,34,26,36,102,-12,4,-63,20,1,40,1,0,0,-1,3,0,-1,2,-1,1,-2,35,35,35,35,36,36,36,36,35,34,34,34,10.403120936,8.4745762712,11.579818031,14.803272302,8.9921318846,14.248218973,14.492753623,10.806638364,10.76509035,9.1954022989,11.270047681,13.559322034,9.0984284533,10.128554733,6.7440989135,11.248593926,7.6277650648,9.2628328831,20.761245675,22.988505747,-0.866926745,-5.084745763,2.4813895782,4.6747175691,2.2480329712,2.9996250469,6.8649885584,1.5438054805,-9.996155325,-13.79310345,1.7338534894,3.3898305085,0.8271298594,2.3373587846,0,0,0,0,0,0,27.74165583,18.644067797,28.949545079,77.132839891,-8.992131885,2.9996250469,-48.05491991,15.438054805,0.768935025,30.651340996,29.475509319,22.033898305,29.776674938,79.470198675,-8.992131885,2.9996250469,-48.05491991,15.438054805,0.768935025,30.651340996 +050,3,7,48,433,Texas,Stonewall County,1490,1490,1496,1463,1452,1418,1388,1400,1404,1374,1345,1336,1348,6,-33,-11,-34,-30,12,4,-30,-29,-9,12,0,10,11,16,18,18,20,12,13,11,13,8,19,28,23,26,23,21,20,22,14,15,-8,-9,-17,-7,-8,-5,-1,-8,-9,-3,-2,0,1,1,2,2,0,0,0,0,0,0,11,-24,4,-29,-24,16,5,-22,-21,-5,14,11,-23,5,-27,-22,16,5,-22,-21,-5,14,3,-1,1,0,0,1,0,0,1,-1,0,27,27,29,23,25,28,29,24,25,27,24,24,6.7590402163,7.5471698113,11.149825784,12.829650748,12.912482066,14.265335235,8.6393088553,9.5623390953,8.2058933234,9.6870342772,12.842176411,19.210977702,16.027874564,18.531717748,16.49928264,14.978601997,14.398848092,16.182420007,10.44386423,11.177347243,-6.083136195,-11.66380789,-4.87804878,-5.702066999,-3.586800574,-0.713266762,-5.759539237,-6.620080912,-2.237970906,-1.490312966,0.6759040216,0.6861063465,1.393728223,1.4255167498,0,0,0,0,0,0,-16.22169652,2.7444253859,-20.20905923,-17.106201,11.477761836,3.5663338088,-15.8387329,-15.44685546,-3.729951511,10.43219076,-15.5457925,3.4305317324,-18.81533101,-15.68068425,11.477761836,3.5663338088,-15.8387329,-15.44685546,-3.729951511,10.43219076 +050,3,7,48,435,Texas,Sutton County,4128,4128,4061,3986,3916,3985,3972,3918,3902,3796,3749,3779,3738,-67,-75,-70,69,-13,-54,-16,-106,-47,30,-41,8,56,45,65,54,43,70,47,49,44,49,18,32,32,39,29,33,34,32,32,24,35,-10,24,13,26,25,10,36,15,17,20,14,0,0,2,6,15,16,23,15,12,12,12,-62,-99,-88,37,-53,-83,-75,-138,-76,-1,-66,-62,-99,-86,43,-38,-67,-52,-123,-64,11,-54,5,0,3,0,0,3,0,2,0,-1,-1,13,13,13,13,13,13,13,13,13,13,13,13,13.918230396,11.38952164,16.453613467,13.572954631,10.899873257,17.902813299,12.210963887,12.988734261,11.689691817,13.037115871,7.9532745122,8.0992153885,9.87216808,7.2891793389,8.3650190114,8.6956521739,8.3138477527,8.4824387011,6.3761955367,9.3122256219,5.9649558842,3.2903062516,6.5814453867,6.2837752922,2.5348542459,9.2071611253,3.8971161341,4.50629556,5.3134962806,3.7248902488,0,0.5062009618,1.5187950892,3.7702651753,4.0557667934,5.8823529412,3.8971161341,3.1809145129,3.1880977683,3.1927630704,-24.60544302,-22.27284232,9.3659030502,-13.32160362,-21.03929024,-19.18158568,-35.85346843,-20.14579192,-0.265674814,-17.56019689,-24.60544302,-21.76664136,10.884698139,-9.551338444,-16.98352345,-13.29923274,-31.9563523,-16.9648774,2.9224229543,-14.36743382 +050,3,7,48,437,Texas,Swisher County,7854,7859,7919,7805,7849,7724,7553,7477,7437,7440,7400,7399,7340,60,-114,44,-125,-171,-76,-40,3,-40,-1,-59,26,111,122,107,104,92,112,70,79,83,83,6,84,79,84,75,90,80,98,89,72,58,20,27,43,23,29,2,32,-28,-10,11,25,1,1,4,4,3,-1,-5,-7,-7,-11,-4,38,-144,-1,-155,-209,-76,-68,39,-22,-1,-81,39,-143,3,-151,-206,-77,-73,32,-29,-12,-85,1,2,-2,3,6,-1,1,-1,-1,0,1,645,645,652,645,644,647,645,646,646,642,639,639,14.1185449,15.587070397,13.741732486,13.615238594,12.242182302,15.019444817,9.4104994286,10.64690027,11.21697412,11.262636543,10.684304248,10.093266897,10.787902138,9.8186816783,11.976047904,10.728174869,13.1746992,11.994609164,9.7303871883,7.8702761381,3.4342406512,5.4938035007,2.9538303474,3.7965569156,0.2661343979,4.2912699477,-3.764199771,-1.347708895,1.4865869315,3.3923604044,0.1271940982,0.5110514884,0.5137096256,0.3927472671,-0.133067199,-0.670510929,-0.941049943,-0.943396226,-1.486586932,-0.542777665,-18.31595014,-0.127762872,-19.90624799,-27.36139294,-10.11310712,-9.118948639,5.2429925388,-2.964959569,-0.135144267,-10.99124771,-18.18875604,0.3832886163,-19.39253837,-26.96864568,-10.24617432,-9.789459568,4.301942596,-3.908355795,-1.621731198,-11.53402537 +050,3,7,48,439,Texas,Tarrant County,1809034,1811345,1818167,1848598,1882950,1913541,1946907,1985664,2023942,2056197,2080998,2101282,2123347,6822,30431,34352,30591,33366,38757,38278,32255,24801,20284,22065,6693,27474,27706,27477,28167,28570,28543,28387,27649,27096,27220,2611,11135,11085,11709,11859,12363,12277,13129,13550,13800,15107,4082,16339,16621,15768,16308,16207,16266,15258,14099,13296,12113,951,4709,5549,5324,7785,8573,7770,7053,5402,4597,3826,1809,9378,12099,9533,9393,13985,14236,9968,5307,2308,5987,2760,14087,17648,14857,17178,22558,22006,17021,10709,6905,9813,-20,5,83,-34,-120,-8,6,-24,-7,83,139,20634,20638,20937,21810,21833,22122,23097,24163,24641,25674,25669,25670,14.9854163,14.849601291,14.474945417,14.592606868,14.529934742,14.237309102,13.914722023,13.366060821,12.95752556,12.886338658,6.0734734841,5.9412340401,6.1683275425,6.1438465173,6.2874897872,6.1237937094,6.4355650629,6.5503318069,6.5992712109,7.151870614,8.9119428161,8.9083672513,8.3066178742,8.4487603511,8.2424449552,8.1135153928,7.4791569601,6.8157290145,6.3582543493,5.7344680444,2.5684765727,2.9741008289,2.8046951777,4.0332106533,4.359997569,3.8756925244,3.4572351579,2.611431175,2.1983224461,1.8112833103,5.1151355486,6.484708223,5.022005847,4.8662745878,7.1123954278,7.1009470756,4.8861080468,2.5655063394,1.1037041996,2.8343317248,7.6836121213,9.4588090519,7.8267010247,8.8994852411,11.472392997,10.9766396,8.3433432047,5.1769375144,3.3020266458,4.6456150351 +050,3,7,48,441,Texas,Taylor County,131506,131515,131842,132867,134122,133972,135049,136210,136330,136615,137319,138141,139200,327,1025,1255,-150,1077,1161,120,285,704,822,1059,485,2017,2046,2065,2063,2103,2116,2034,2045,2060,2029,329,1130,1274,1309,1224,1332,1347,1332,1423,1427,1485,156,887,772,756,839,771,769,702,622,633,544,85,187,514,356,418,493,329,261,141,171,146,91,-43,-9,-1283,-159,-86,-974,-673,-55,16,359,176,144,505,-927,259,407,-645,-412,86,187,505,-5,-6,-22,21,-21,-17,-4,-5,-4,2,10,5287,5284,5289,5641,5183,4884,5066,5103,5036,4897,4864,4866,15.23937607,15.326474124,15.405044499,15.337092643,15.505476316,15.527995891,14.904101559,14.930603722,14.956799535,14.631807053,8.5376772229,9.5434643375,9.7652315979,9.0996613647,9.8208723029,9.8847875541,9.7602081005,10.389363861,10.36085094,10.708838578,6.7016988467,5.7830097869,5.6398129014,6.2374312786,5.6846040131,5.6432083364,5.1438934584,4.5412398607,4.5959485951,3.9229684756,1.4128722484,3.8503458944,2.6557849113,3.1075640935,3.6349024364,2.4143245028,1.9124732089,1.0294450488,1.2415595731,1.05285551,-0.324885062,-0.067418508,-9.571269779,-1.182063854,-0.634080344,-7.147574668,-4.931396435,-0.401556579,0.1161693168,2.5888707404,1.0879871859,3.7829273865,-6.915484867,1.9255002398,3.0008220925,-4.733250165,-3.018923226,0.6278884695,1.3577288899,3.6417262504 +050,3,7,48,443,Texas,Terrell County,984,981,1007,945,917,887,906,863,815,810,792,752,702,26,-62,-28,-30,19,-43,-48,-5,-18,-40,-50,5,13,13,8,11,13,10,11,6,5,4,0,17,9,15,7,16,12,8,13,8,10,5,-4,4,-7,4,-3,-2,3,-7,-3,-6,1,1,2,2,5,1,1,1,1,1,1,18,-58,-36,-25,11,-43,-47,-8,-12,-38,-43,19,-57,-34,-23,16,-42,-46,-7,-11,-37,-42,2,-1,2,0,-1,2,0,-1,0,0,-2,0,0,0,0,0,0,0,0,0,0,0,0,13.319672131,13.963480129,8.8691796009,12.26993865,14.697569248,11.918951132,13.538461538,7.4906367041,6.4766839378,5.5020632737,17.418032787,9.6670247046,16.629711752,7.8081427775,18.089315998,14.302741359,9.8461538462,16.229712859,10.362694301,13.755158184,-4.098360656,4.2964554243,-7.760532151,4.4617958728,-3.39174675,-2.383790226,3.6923076923,-8.739076155,-3.886010363,-8.253094911,1.0245901639,2.1482277121,2.2172949002,5.577244841,1.1305822499,1.1918951132,1.2307692308,1.2484394507,1.2953367876,1.3755158184,-59.42622951,-38.66809882,-27.71618625,12.26993865,-48.61503674,-56.01907032,-9.846153846,-14.98127341,-49.22279793,-59.14718019,-58.40163934,-36.51987111,-25.49889135,17.847183491,-47.48445449,-54.82717521,-8.615384615,-13.73283396,-47.92746114,-57.77166437 +050,3,7,48,445,Texas,Terry County,12651,12651,12681,12657,12630,12716,12796,12761,12767,12427,12311,12354,12183,30,-24,-27,86,80,-35,6,-340,-116,43,-171,43,190,201,181,220,197,184,201,178,175,178,14,141,135,109,125,128,141,129,140,104,130,29,49,66,72,95,69,43,72,38,71,48,6,23,17,19,13,10,-1,-5,-8,-4,-3,-4,-97,-114,-4,-25,-115,-35,-411,-145,-24,-217,2,-74,-97,15,-12,-105,-36,-416,-153,-28,-220,-1,1,4,-1,-3,1,-1,4,-1,0,1,1166,1166,1162,1120,1099,1174,1177,1164,958,1028,1044,1041,14.997237351,15.897496737,14.282332518,17.246785826,15.416519936,14.415543717,15.956180043,14.390815749,14.190147983,14.508701145,11.129528771,10.677423182,8.6009626766,9.7993101286,10.016825136,11.046693826,10.24053346,11.318619128,8.4330022299,10.596242409,3.86770858,5.2200735556,5.6813698414,7.4474756977,5.3996947999,3.3688498903,5.7156465825,3.0721966206,5.7571457531,3.9124587358,1.8154550478,1.3445644007,1.4992503748,1.0191282534,0.7825644637,-0.078345346,-0.396919902,-0.646778236,-0.32434624,-0.244528671,-7.656484332,-9.016490687,-0.315631658,-1.959862026,-8.999491333,-2.74208712,-32.62681591,-11.72285553,-1.946077438,-17.68757387,-5.841029284,-7.671926286,1.183618717,-0.940733772,-8.216926869,-2.820432466,-33.02373581,-12.36963376,-2.270423677,-17.93210254 +050,3,7,48,447,Texas,Throckmorton County,1641,1641,1639,1637,1610,1605,1612,1558,1542,1510,1485,1473,1487,-2,-2,-27,-5,7,-54,-16,-32,-25,-12,14,5,14,14,19,15,8,19,15,9,16,14,0,22,23,19,20,22,26,24,19,17,22,5,-8,-9,0,-5,-14,-7,-9,-10,-1,-8,0,3,2,0,0,0,0,0,0,0,0,-6,3,-21,-7,13,-40,-11,-23,-14,-12,22,-6,6,-19,-7,13,-40,-11,-23,-14,-12,22,-1,0,1,2,-1,0,2,0,-1,1,0,13,13,14,14,14,13,13,13,13,13,13,13,8.547008547,8.6233446258,11.819595645,9.3254585017,5.047318612,12.258064516,9.8296199214,6.0100166945,10.818120352,9.4594594595,13.431013431,14.166923314,11.819595645,12.433944669,13.880126183,16.774193548,15.727391874,12.687813022,11.494252874,14.864864865,-4.884004884,-5.543578688,0,-3.108486167,-8.832807571,-4.516129032,-5.897771953,-6.677796327,-0.676132522,-5.405405405,1.8315018315,1.2319063751,0,0,0,0,0,0,0,0,1.8315018315,-12.93501694,-4.354587869,8.0820640348,-25.23659306,-7.096774194,-15.07208388,-9.348914858,-8.113590264,14.864864865,3.663003663,-11.70311056,-4.354587869,8.0820640348,-25.23659306,-7.096774194,-15.07208388,-9.348914858,-8.113590264,14.864864865 +050,3,7,48,449,Texas,Titus County,32334,32334,32417,32447,32605,32575,32484,32605,32455,32652,32767,32744,32926,83,30,158,-30,-91,121,-150,197,115,-23,182,120,494,521,481,502,534,491,521,461,455,432,62,258,269,263,260,307,282,289,301,259,272,58,236,252,218,242,227,209,232,160,196,160,6,22,41,28,51,38,71,54,80,-23,12,21,-229,-130,-279,-393,-143,-430,-88,-124,-198,9,27,-207,-89,-251,-342,-105,-359,-34,-44,-221,21,-2,1,-5,3,9,-1,0,-1,-1,2,1,357,357,459,460,461,510,548,472,437,451,425,426,15.231869758,16.017954867,14.759128567,15.432146206,16.408302478,15.093759607,16.004423487,14.093764808,13.890796965,13.156692554,7.9551060681,8.2703068315,8.0699601105,7.9927450468,9.433237567,8.668920996,8.8776936428,9.2022195387,7.9070690418,8.2838434597,7.2767636902,7.7476480354,6.6891684566,7.4394011589,6.9750649111,6.4248386105,7.1267298447,4.8915452697,5.9837279236,4.872849094,0.6783423779,1.2605300375,0.8591592513,1.5678076823,1.1676320116,2.1826006763,1.6588078087,2.4457726349,-0.702172154,0.365463682,-7.060927479,-3.996802558,-8.560908254,-12.08134155,-4.393983622,-13.21856748,-2.703242355,-3.790947584,-6.044786372,0.2740977615,-6.382585101,-2.73627252,-7.701749003,-10.51353387,-3.226351611,-11.0359668,-1.044434546,-1.345174949,-6.746958526,0.6395614436 +050,3,7,48,451,Texas,Tom Green County,110224,110220,110675,111761,113324,114708,116366,117574,117742,117745,118299,119429,120010,455,1086,1563,1384,1658,1208,168,3,554,1130,581,396,1514,1531,1530,1574,1729,1614,1566,1496,1499,1465,200,986,1004,973,1081,1040,995,1097,1106,1086,1097,196,528,527,557,493,689,619,469,390,413,368,56,83,259,105,61,105,100,34,-30,10,15,194,476,761,718,1083,421,-547,-496,200,704,190,250,559,1020,823,1144,526,-447,-462,170,714,205,9,-1,16,4,21,-7,-4,-4,-6,3,8,5165,5164,5198,5296,5249,5457,5425,5338,5217,5217,4987,4984,13.612904386,13.603749695,13.419169239,13.62334144,14.781567923,13.717724252,13.300097245,12.675602854,12.611051286,12.236937174,8.8654714165,8.9210742608,8.5338899804,9.3563100998,8.8911686757,8.4567135256,9.316862502,9.3711341953,9.1364921255,9.1630853787,4.7474329695,4.6826754337,4.8852792591,4.2670313406,5.8903992477,5.261010726,3.9832347433,3.3044686584,3.47455916,3.0738517952,0.7462820766,2.3013528223,0.9209233792,0.5279693951,0.8976660682,0.8499209574,0.2887632863,-0.254189897,0.0841297617,0.1252928721,4.2798827528,6.7618899527,6.2973617738,9.3736205718,3.5992134735,-4.649067637,-4.212546765,1.694599312,5.9227352268,1.5870430465,5.0261648294,9.063242775,7.218285153,9.9015899669,4.4968795418,-3.799146679,-3.923783478,1.4404094152,6.0068649886,1.7123359185 +050,3,7,48,453,Texas,Travis County,1024266,1024314,1030392,1061662,1096918,1122346,1152411,1180003,1206283,1227373,1246693,1273567,1300503,6078,31270,35256,25428,30065,27592,26280,21090,19320,26874,26936,3862,15639,15576,15839,15986,16389,16301,15525,15258,15093,15463,1116,4667,4719,5133,4942,5334,5340,5607,5712,6348,6880,2746,10972,10857,10706,11044,11055,10961,9918,9546,8745,8583,952,4352,5004,4974,6413,7200,6623,6016,4363,4331,3430,2184,15791,18560,9472,12153,9169,8606,5091,5344,13709,14914,3136,20143,23564,14446,18566,16369,15229,11107,9707,18040,18344,196,155,835,276,455,168,90,65,67,89,9,23046,23046,23000,23251,22926,22910,22781,22661,22876,23004,22367,22367,14.950856909,14.431709735,14.274101684,14.055127647,14.053251267,13.662234954,12.75858215,12.33435163,11.977335672,12.014436282,4.4616439155,4.3723188392,4.6258579421,4.3450794964,4.573802078,4.4755741768,4.6078821329,4.617500099,5.0375754882,5.3456199715,10.489212994,10.059390896,9.6482437421,9.7100481502,9.4794491887,9.1866607775,8.1507000168,7.716851531,6.9397601835,6.6688163104,4.1605044612,4.6363813248,4.4825671934,5.6384044538,6.1738610727,5.5508853507,4.944001946,3.5269875581,3.4369469817,2.6650401893,15.096168646,17.196490285,8.5361633406,10.685097353,7.8622405799,7.2128822782,4.1838287745,4.3200140982,10.87903629,11.587874456,19.256673107,21.83287161,13.018730534,16.323501807,14.036101653,12.763767629,9.1278307205,7.8470016564,14.315983272,14.252914645 +050,3,7,48,455,Texas,Trinity County,14585,14675,14728,14687,14375,14450,14303,14541,14535,14680,14672,14675,14883,53,-41,-312,75,-147,238,-6,145,-8,3,208,42,180,109,113,156,149,136,153,143,137,138,29,230,214,233,208,219,256,247,267,215,221,13,-50,-105,-120,-52,-70,-120,-94,-124,-78,-83,0,-3,-2,-3,11,11,11,11,8,8,4,39,11,-208,195,-103,295,102,229,108,75,289,39,8,-210,192,-92,306,113,240,116,83,293,1,1,3,3,-3,2,1,-1,0,-2,-2,138,138,137,134,131,131,138,132,138,141,153,153,12.238653748,7.5012043218,7.8404163053,10.85104163,10.331438081,9.3547943321,10.474071539,9.7437994004,9.3365591031,9.3375735841,15.638279789,14.72713509,16.166522116,14.468055507,15.185133823,17.609024625,16.909122026,18.192968111,14.652264286,14.95365045,-3.399626041,-7.225930769,-8.326105811,-3.617013877,-4.853695743,-8.254230293,-6.435050488,-8.449168711,-5.315705183,-5.616076866,-0.203977562,-0.137636777,-0.208152645,0.7651375509,0.7627236167,0.7566377769,0.753037823,0.5451076588,0.5452005316,0.2706543068,0.747917729,-14.31422476,13.529921943,-7.164469794,20.45486063,7.0160957491,15.676878316,7.3589533933,5.1112549835,19.554773665,0.5439401666,-14.45186154,13.321769297,-6.399332244,21.217584246,7.7727335259,16.429916139,7.9040610521,5.656455515,19.825427972 +050,3,7,48,457,Texas,Tyler County,21766,21760,21763,21676,21504,21509,21469,21372,21416,21498,21593,21523,21591,3,-87,-172,5,-40,-97,44,82,95,-70,68,53,216,214,244,212,210,209,198,187,187,183,46,253,269,282,286,267,269,258,295,280,277,7,-37,-55,-38,-74,-57,-60,-60,-108,-93,-94,2,1,5,9,10,3,-3,-3,-4,-4,-2,-3,-51,-120,38,27,-40,108,146,208,29,164,-1,-50,-115,47,37,-37,105,143,204,25,162,-3,0,-2,-4,-3,-3,-1,-1,-1,-2,0,2448,2448,2436,2447,2420,2425,2392,2421,2444,2421,2285,2287,9.9449803172,9.9119962946,11.345407202,9.8655125878,9.8036927243,9.7690941385,9.2277578413,8.6793065837,8.6742740514,8.489121863,11.648518612,12.459471978,13.112314882,13.309134906,12.464695035,12.573618772,12.024048096,13.691954236,12.988217831,12.849654405,-1.703538295,-2.547475683,-1.766907679,-3.443622318,-2.661002311,-2.804524633,-2.796290255,-5.012647653,-4.31394378,-4.360532542,0.0460415755,0.2315886985,0.4184781345,0.4653543674,0.1400527532,-0.140226232,-0.139814513,-0.185653617,-0.185545969,-0.092777288,-2.348120353,-5.558128763,1.7669076791,1.2564567918,-1.867370043,5.0481443395,6.804306287,9.6539880718,1.3452082754,7.6077376258,-2.302078777,-5.326540065,2.1853858136,1.7218111592,-1.72731729,4.9079181079,6.6644917742,9.468334455,1.1596623063,7.5149603377 +050,3,7,48,459,Texas,Upshur County,39309,39304,39372,39728,39921,39769,40303,40343,40807,41103,41150,41705,42166,68,356,193,-152,534,40,464,296,47,555,461,113,514,469,485,475,474,469,470,469,434,438,76,458,446,400,443,479,449,512,496,435,467,37,56,23,85,32,-5,20,-42,-27,-1,-29,9,41,52,27,22,9,7,0,-4,-6,0,24,260,127,-266,475,42,437,341,80,564,493,33,301,179,-239,497,51,444,341,76,558,493,-2,-1,-9,2,5,-6,0,-3,-2,-2,-3,516,516,516,516,512,481,439,471,446,479,465,465,12.996207332,11.77667014,12.172167148,11.86432211,11.755077747,11.558841651,11.476010255,11.403839374,10.476133003,10.444611367,11.580278129,11.19913621,10.03890074,11.065041463,11.879076458,11.065927295,12.501526065,12.060350382,10.500271559,11.136149563,1.4159292035,0.5775339301,2.1332664073,0.7992806474,-0.12399871,0.4929143561,-1.02551581,-0.656511009,-0.024138555,-0.691538196,1.0366624526,1.3057288855,0.6776258,0.5495054451,0.2231976787,0.1725200246,0,-0.09726089,-0.144831332,0,6.5739570164,3.1889917011,-6.675868992,11.86432211,1.0415891675,10.770178681,8.3262116958,1.9452178036,13.614145193,11.756149325,7.610619469,4.4947205866,-5.998243192,12.413827555,1.2647868462,10.942698706,8.3262116958,1.8479569134,13.469313862,11.756149325 +050,3,7,48,461,Texas,Upton County,3355,3349,3340,3284,3265,3389,3486,3658,3698,3657,3632,3644,3623,-9,-56,-19,124,97,172,40,-41,-25,12,-21,9,39,55,56,54,49,67,70,33,44,38,14,38,42,31,33,33,27,27,38,26,22,-5,1,13,25,21,16,40,43,-5,18,16,0,5,3,10,11,9,6,5,5,6,5,-6,-61,-37,88,63,144,-6,-90,-25,-12,-41,-6,-56,-34,98,74,153,0,-85,-20,-6,-36,2,-1,2,1,2,3,0,1,0,0,-1,61,61,63,61,61,61,63,61,62,63,63,63,11.775362319,16.796457474,16.831980763,15.709090909,13.717805151,18.216421968,19.034670292,9.0547400192,12.094557449,10.458235861,11.473429952,12.826385708,9.3177036369,9.6,9.2385218365,7.3409461664,7.3419442556,10.426670325,7.1467839472,6.0547681299,0.3019323671,3.9700717667,7.5142771265,6.1090909091,4.4792833147,10.875475802,11.692726037,-1.371930306,4.9477735019,4.4034677308,1.5096618357,0.9161704077,3.0057108506,3.2,2.5195968645,1.6313213703,1.3596193066,1.3719303059,1.649257834,1.3760836659,-18.4178744,-11.29943503,26.450255485,18.327272727,40.313549832,-1.63132137,-24.47314752,-6.85965153,-3.298515668,-11.28388606,-16.90821256,-10.38326462,29.455966336,21.527272727,42.833146697,0,-23.11352821,-5.487721224,-1.649257834,-9.907802394 +050,3,7,48,463,Texas,Uvalde County,26405,26403,26441,26587,26744,26905,27017,26948,27082,27073,26805,26794,26742,38,146,157,161,112,-69,134,-9,-268,-11,-52,96,412,382,428,385,439,391,384,388,399,383,74,218,234,276,255,238,253,235,264,257,277,22,194,148,152,130,201,138,149,124,142,106,9,59,41,2,-8,18,36,34,44,-5,4,9,-106,-28,12,-2,-288,-39,-192,-437,-148,-160,18,-47,13,14,-10,-270,-3,-158,-393,-153,-156,-2,-1,-4,-5,-8,0,-1,0,1,0,-2,564,564,596,575,564,562,551,623,588,562,528,529,15.538960549,14.325626746,15.955563011,14.279885761,16.269804503,14.473440681,14.181516019,14.402910279,14.888337469,14.308129109,8.2220713585,8.775383923,10.289101381,9.4581061533,8.8205318262,9.3651674995,8.6787923553,9.799918334,9.5897311517,10.348176928,7.3168891906,5.5502428231,5.6664616302,4.8217796076,7.4492726767,5.1082731816,5.5027236636,4.6029919448,5.2986063173,3.9599521817,2.2252394961,1.5375672686,0.0745587057,-0.296724899,0.6670990457,1.3325930039,1.2556550642,1.6333197223,-0.186570645,0.1494321578,-3.997887908,-1.05004594,0.447352234,-0.074181225,-10.67358473,-1.443642421,-7.090758009,-16.22183452,-5.522491091,-5.977286312,-1.772648412,0.4875213291,0.5219109396,-0.370906124,-10.00648569,-0.111049417,-5.835102945,-14.58851479,-5.709061736,-5.827854154 +050,3,7,48,465,Texas,Val Verde County,48879,48879,48963,48962,48968,49027,48821,48860,48901,49071,49048,49041,49028,84,-1,6,59,-206,39,41,170,-23,-7,-13,207,882,874,893,851,924,871,860,745,743,752,122,330,325,371,312,360,330,364,445,346,396,85,552,549,522,539,564,541,496,300,397,356,21,28,170,92,118,108,135,44,6,15,15,-18,-581,-733,-562,-884,-635,-635,-370,-329,-421,-381,3,-553,-563,-470,-766,-527,-500,-326,-323,-406,-366,-4,0,20,7,21,2,0,0,0,2,-3,1945,1951,1938,1937,1955,1870,1915,1906,1934,1949,1890,1892,18.013786061,17.849484326,18.225419664,17.394325893,18.918725238,17.818966664,17.556036419,15.185641925,15.14950708,15.33614088,6.7398519275,6.637394057,7.5718148885,6.3772381653,7.370931911,6.7511584374,7.4306944841,9.0706183308,7.0548175636,8.0759465274,11.273934133,11.212090269,10.653604776,11.017087728,11.547793327,11.067808226,10.125341934,6.1150235938,8.0946895167,7.260194353,0.5718662242,3.4718676606,1.8776468187,2.4119041779,2.2112795733,2.7618375426,0.8982158168,0.1223004719,0.3058446921,0.3059070654,-11.86622415,-14.96987644,-11.46997296,-18.06884147,-13.0015049,-12.99086548,-7.553178459,-6.706142541,-8.584041024,-7.770039462,-11.29435793,-11.49800878,-9.592326139,-15.65693729,-10.79022533,-10.22902794,-6.654962642,-6.583842069,-8.278196332,-7.464132397 +050,3,7,48,467,Texas,Van Zandt County,52579,52549,52576,52490,52211,52328,52782,53431,54407,55141,56025,56744,57533,27,-86,-279,117,454,649,976,734,884,719,789,122,563,529,610,563,564,672,613,637,640,650,164,660,604,685,585,652,628,686,645,686,726,-42,-97,-75,-75,-22,-88,44,-73,-8,-46,-76,5,11,25,36,65,78,67,53,37,48,38,69,3,-232,164,417,654,866,754,857,720,831,74,14,-207,200,482,732,933,807,894,768,869,-5,-3,3,-8,-6,5,-1,0,-2,-3,-4,667,667,615,642,625,644,608,573,575,560,532,532,10.717073078,10.104965569,11.670285731,10.712586814,10.620168906,12.463139153,11.191441195,11.460338593,11.350637143,11.37586741,12.563531494,11.537616642,13.105156927,11.13119589,12.277216537,11.64710028,12.524190309,11.604267492,12.166464188,12.70596883,-1.846458417,-1.432651073,-1.434871196,-0.418609076,-1.657047631,0.8160388731,-1.332749115,-0.143928899,-0.815827045,-1.33010142,0.2093921916,0.4775503577,0.6887381743,1.2367995433,1.4687467636,1.2426046477,0.9676123708,0.6656711584,0.8512977857,0.6650507101,0.0571069613,-4.431667319,3.1375850161,7.9345447626,12.31487671,16.06112873,13.765655238,15.418383319,12.769466786,14.54360895,0.2664991529,-3.954116962,3.8263231904,9.171344306,13.783623474,17.303733378,14.733267609,16.084054477,13.620764572,15.20865966 +050,3,7,48,469,Texas,Victoria County,86793,86795,86883,87560,89124,90075,91037,92130,92423,92011,91829,92021,91936,88,677,1564,951,962,1093,293,-412,-182,192,-85,313,1254,1294,1298,1302,1352,1356,1243,1162,1211,1185,139,715,811,780,772,804,824,837,810,827,918,174,539,483,518,530,548,532,406,352,384,267,23,80,70,39,92,73,68,43,19,24,16,-104,62,989,389,342,476,-303,-865,-553,-217,-370,-81,142,1059,428,434,549,-235,-822,-534,-193,-354,-5,-4,22,5,-2,-4,-4,4,0,1,2,1508,1508,1500,1626,1716,1807,1844,1891,1890,1880,1899,1902,14.37718911,14.647619479,14.486687984,14.377843544,14.762484509,14.694965674,13.479076526,12.641427328,13.173782975,12.883445588,8.1975201069,9.1802313735,8.7054057221,8.5251115332,8.7788739238,8.9296841558,9.0764175803,8.8120104439,8.9964645091,9.9805932908,6.1796690036,5.4673881053,5.7812822616,5.8527320111,5.9836105849,5.765281518,4.4026589457,3.8294168842,4.1773184661,2.902852297,0.9172050469,0.7923750877,0.4352702861,1.015945934,0.7970868115,0.7369156828,0.4662914647,0.2067014795,0.2610824041,0.1739536957,0.7108339114,11.195128025,4.3415420845,3.7766685808,5.1974427708,-3.283609586,-9.380049232,-6.016100957,-2.360620071,-4.022679213,1.6280389583,11.987503113,4.7768123706,4.7926145148,5.9945295823,-2.546693904,-8.913757767,-5.809399478,-2.099537667,-3.848725517 +050,3,7,48,471,Texas,Walker County,67861,67862,68239,68405,68602,69402,70064,70825,71811,72764,73037,71700,72164,377,166,197,800,662,761,986,953,273,-1337,464,147,611,566,633,648,657,638,643,618,584,578,68,491,491,496,503,494,549,535,557,604,687,79,120,75,137,145,163,89,108,61,-20,-109,19,118,109,115,213,221,193,179,136,135,101,263,-74,23,534,306,380,697,659,78,-1459,467,282,44,132,649,519,601,890,838,214,-1324,568,16,2,-10,14,-2,-3,7,7,-2,7,5,16708,16739,16890,16867,17255,17356,17089,17059,17442,17714,16628,16621,8.9429466351,8.2623515587,9.1736471407,9.2925874407,9.3264910674,8.945848173,8.8950371779,8.4773081117,8.0698093784,8.0353667352,7.1865577706,7.1675169882,7.1881974436,7.2132275967,7.0126127661,7.6979163745,7.4010029397,7.6405511622,8.3461727133,9.5506867597,1.7563888645,1.0948345705,1.9854496971,2.079359844,2.3138783014,1.2479317984,1.4940342383,0.8367569495,-0.276363335,-1.515320024,1.7271157168,1.5911595758,1.6666183589,3.0545079087,3.1372215006,2.7061891809,2.4762234135,1.8655564777,1.8654525104,1.4041038759,-1.083106466,0.3357492683,7.7389061187,4.3881662914,5.3943175124,9.7731288034,9.1163755836,1.0699515092,-20.16070528,6.4922426736,0.6440092503,1.9269088441,9.4055244776,7.4426742002,8.531539013,12.479317984,11.592598997,2.9355079869,-18.29525277,7.8963465495 +050,3,7,48,473,Texas,Waller County,43205,43319,43558,44138,44365,45436,46793,48663,50062,51736,53568,55311,57452,239,580,227,1071,1357,1870,1399,1674,1832,1743,2141,145,565,566,578,604,680,611,632,664,663,683,34,288,262,296,294,322,324,300,358,332,386,111,277,304,282,310,358,287,332,306,331,297,12,18,4,9,46,87,78,55,39,33,26,111,284,-71,760,975,1407,1028,1276,1479,1382,1830,123,302,-67,769,1021,1494,1106,1331,1518,1415,1856,5,1,-10,20,26,18,6,11,8,-3,-12,3703,3710,3887,3893,4192,4226,4244,4235,4684,4670,4612,4611,12.885422368,12.790526875,12.872907874,13.097832569,14.247401944,12.377817169,12.416746891,12.611106891,12.178657041,12.11390261,6.5681444992,5.920703253,6.5923542054,6.3754350584,6.7465638619,6.5636870094,5.8940254229,6.7993618476,6.0985130282,6.8462172876,6.317277869,6.8698236218,6.2805536687,6.7223975105,7.5008380825,5.8141301595,6.522721468,5.8117450429,6.0801440131,5.2676853223,0.4105090312,0.0903924161,0.2004432022,0.99751705,1.8228293664,1.5801468726,1.0805713275,0.7407126035,0.6061774998,0.4611441696,6.47692027,-1.604465385,16.926314852,21.143024428,29.479550788,20.825525449,25.069254799,28.090101041,25.385978931,32.457455016,6.8874293012,-1.514072969,17.126758054,22.140541478,31.302380154,22.405672322,26.149826126,28.830813644,25.992156431,32.918599186 +050,3,7,48,475,Texas,Ward County,10658,10658,10595,10671,10825,11206,11571,11630,11573,11377,11691,11985,12097,-63,76,154,381,365,59,-57,-196,314,294,112,29,133,178,198,183,187,191,160,202,194,216,35,98,126,117,101,127,121,128,110,77,82,-6,35,52,81,82,60,70,32,92,117,134,0,0,0,9,11,10,8,4,3,5,7,-60,43,99,285,262,-9,-134,-233,219,173,-28,-60,43,99,294,273,1,-126,-229,222,178,-21,3,-2,3,6,10,-2,-1,1,0,-1,-1,125,125,127,127,125,124,129,126,120,122,124,124,12.508229098,16.561220692,17.974672053,16.068841375,16.119994828,16.463388355,13.94335512,17.51343853,16.387903362,17.93870941,9.2165898618,11.723111277,10.621397122,8.868595513,10.947803974,10.429685816,11.154684096,9.5370209814,6.5044771076,6.8100656092,3.2916392363,4.8381094157,7.3532749308,7.2002458621,5.1721908538,6.0337025385,2.788671024,7.9764175481,9.8834262544,11.1286438,0,0,0.8170305479,0.96588664,0.862031809,0.6895660044,0.348583878,0.2601005722,0.4223686434,0.5813470642,4.0440139189,9.211016003,25.872634016,23.005663608,-0.775828628,-11.55023057,-20.30501089,18.987341772,14.61395506,-2.325388257,4.0440139189,9.211016003,26.689664564,23.971550248,0.0862031809,-10.86066457,-19.95642702,19.247442344,15.036323703,-1.744041193 +050,3,7,48,477,Texas,Washington County,33718,33687,33695,33952,33916,34187,34384,34820,34688,34804,35485,35626,35771,8,257,-36,271,197,436,-132,116,681,141,145,102,436,379,407,407,421,399,393,387,362,363,110,373,381,374,366,398,381,356,387,377,435,-8,63,-2,33,41,23,18,37,0,-15,-72,8,48,80,42,29,29,8,-7,-11,-9,-5,13,146,-114,194,135,382,-156,89,689,166,222,21,194,-34,236,164,411,-148,82,678,157,217,-5,0,0,2,-8,2,-2,-3,3,-1,0,1816,1816,2043,1901,1988,1956,2118,2106,2081,2530,2292,2293,12.890445992,11.168739317,11.952483738,11.870907527,12.166926767,11.48069287,11.310654464,11.011680348,10.181265908,10.168494475,11.027835676,11.227677256,10.983363435,10.675066719,11.502225305,10.962766876,10.245783687,11.011680348,10.603141567,12.185385941,1.8626103153,-0.058937938,0.9691203031,1.1958408073,0.6647014623,0.5179259941,1.0648707765,0,-0.421875659,-2.016891466,1.4191316688,2.357517534,1.2334258403,0.8458386198,0.8381018438,0.2301893307,-0.201462039,-0.312993498,-0.253125396,-0.140061907,4.3165254926,-3.359462486,5.6972526908,3.9375246095,11.039824288,-4.488691949,2.5614459218,19.604774574,4.6687572949,6.2187486869,5.7356571614,-1.001944952,6.930678531,4.7833632294,11.877926131,-4.258502618,2.359983883,19.291781075,4.4156318994,6.0786867796 +050,3,7,48,479,Texas,Webb County,250304,250304,251358,255877,260487,264280,267258,269598,272053,273378,274734,276387,277681,1054,4519,4610,3793,2978,2340,2455,1325,1356,1653,1294,1328,5496,5438,5499,5502,5420,5310,5083,4753,4659,4638,311,1169,1257,1239,1276,1350,1327,1413,1379,1412,1482,1017,4327,4181,4260,4226,4070,3983,3670,3374,3247,3156,128,901,892,635,770,916,1134,558,354,527,433,-76,-702,-426,-1097,-2033,-2660,-2668,-2913,-2380,-2128,-2299,52,199,466,-462,-1263,-1744,-1534,-2355,-2026,-1601,-1866,-15,-7,-37,-5,15,14,6,10,8,7,4,3479,3493,3481,3511,3599,3650,3576,3630,3545,3608,3648,3647,21.670428894,21.062661223,20.957872732,20.702188743,20.191634256,19.606720933,18.638471227,17.343170739,16.907357912,16.741627381,4.6093033801,4.8686585432,4.722095711,4.8011619113,5.0292815951,4.899834026,5.1812236562,5.0318183145,5.1241016038,5.3495238852,17.061125514,16.19400268,16.235777021,15.901026832,15.162352661,14.706886907,13.457247571,12.311352424,11.783256309,11.392103496,3.5525939653,3.4549271444,2.4201216921,2.8972528775,3.4124606971,4.1871980297,2.0460883228,1.2917068044,1.9124656836,1.5629850488,-2.767947795,-1.649998838,-4.180903144,-7.64950013,-9.909547439,-9.851361855,-10.68146108,-8.684356482,-7.722442077,-8.298620386,0.7846461699,1.8049283064,-1.760781452,-4.752247252,-6.497086742,-5.664163825,-8.63537276,-7.392649677,-5.809976394,-6.735635337 +050,3,7,48,481,Texas,Wharton County,41280,41280,41280,41286,41130,41115,41082,41369,41619,41869,41515,41671,41685,0,6,-156,-15,-33,287,250,250,-354,156,14,131,549,533,555,559,551,583,588,547,605,598,139,393,402,455,397,433,411,441,451,401,430,-8,156,131,100,162,118,172,147,96,204,168,4,27,7,-5,8,3,34,2,-7,10,5,10,-178,-299,-106,-200,172,48,104,-443,-57,-160,14,-151,-292,-111,-192,175,82,106,-450,-47,-155,-6,1,5,-4,-3,-6,-4,-3,0,-1,1,449,449,547,520,468,467,477,491,488,486,477,477,13.298452147,12.934381673,13.496261171,13.60146964,13.365514063,14.050224129,14.08585665,13.120023026,14.545716827,14.348097318,9.5196570017,9.7553873034,11.064502401,9.6597199411,10.503207966,9.9050465127,10.564392488,10.817423007,9.6410453682,10.317193723,3.7787951457,3.17899437,2.4317587695,3.9417496989,2.862306097,4.145177616,3.5214641625,2.3026000192,4.9046714591,4.0309035942,0.6540222368,0.1698699282,-0.121587938,0.1946543061,0.072770494,0.8193955753,0.047911077,-0.167897918,0.2404250715,0.1199673689,-4.311702153,-7.255872646,-2.577664296,-4.866357653,4.1721749888,1.1567937533,2.4913760061,-10.62553967,-1.370422908,-3.838955804,-3.657679917,-7.086002718,-2.699252234,-4.671703347,4.2449454828,1.9761893286,2.5392870832,-10.79343759,-1.129997836,-3.718988435 +050,3,7,48,483,Texas,Wheeler County,5410,5406,5387,5447,5593,5720,5701,5665,5526,5301,5136,5026,4946,-19,60,146,127,-19,-36,-139,-225,-165,-110,-80,11,70,68,76,97,84,83,75,54,43,42,22,54,66,69,74,85,59,78,62,59,63,-11,16,2,7,23,-1,24,-3,-8,-16,-21,2,9,4,3,5,5,0,-1,-1,-1,-1,-9,35,135,113,-48,-41,-164,-222,-155,-93,-58,-7,44,139,116,-43,-36,-164,-223,-156,-94,-59,-1,0,5,4,1,1,1,1,-1,0,0,46,46,46,42,42,40,39,40,39,40,45,45,12.922281706,12.31884058,13.435870238,16.986253393,14.780925567,14.833348226,13.854253256,10.347801092,8.4629010037,8.4235860409,9.9686173159,11.956521739,12.198355874,12.958585063,14.956888967,10.544187293,14.408423386,11.880808661,11.611887424,12.635379061,2.9536643899,0.3623188406,1.237514364,4.0276683303,-0.1759634,4.2891609329,-0.55417013,-1.533007569,-3.14898642,-4.21179302,1.6614362193,0.7246376812,0.5303632989,0.8755800718,0.8798169981,0,-0.184723377,-0.191625946,-0.196811651,-0.200561572,6.4611408529,24.456521739,19.97701759,-8.405568689,-7.214499384,-29.30926637,-41.00858964,-29.70202165,-18.30348357,-11.6325712,8.1225770722,25.18115942,20.507380889,-7.529988617,-6.334682386,-29.30926637,-41.19331301,-29.8936476,-18.50029522,-11.83313277 +050,3,7,48,485,Texas,Wichita County,131500,131659,131802,130825,131742,132255,132721,131050,131386,131807,132046,132328,133205,143,-977,917,513,466,-1671,336,421,239,282,877,459,1795,1784,1788,1804,1762,1666,1654,1628,1579,1570,267,1331,1297,1329,1331,1342,1299,1460,1462,1370,1440,192,464,487,459,473,420,367,194,166,209,130,140,270,753,420,449,482,328,238,115,173,138,-181,-1721,-301,-347,-438,-2602,-352,-4,-38,-103,601,-41,-1451,452,73,11,-2120,-24,234,77,70,739,-8,10,-22,-19,-18,29,-7,-7,-4,3,8,12187,12198,12191,12225,12250,12688,12399,12610,12621,12791,12700,12698,13.669577005,13.588912544,13.545608473,13.616327516,13.3600737,12.696428844,12.568723332,12.340204584,11.945198847,11.825272188,10.136048464,9.879383167,10.068296231,10.046192863,10.175493136,9.8995564633,11.094519991,11.081928195,10.364105396,10.846109523,3.5335285405,3.7095293773,3.4773122422,3.5701346537,3.1845805642,2.7968723803,1.4742033413,1.2582763887,1.5810934509,0.9791626653,2.0561480731,5.7356788934,3.1818543393,3.3889861723,3.6546853142,2.4996570592,1.8085587383,0.8716974982,1.3087519953,1.0394188293,-13.10604013,-2.292748137,-2.628817752,-3.305959785,-19.72923483,-2.682558795,-0.030395945,-0.288039173,-0.779199165,4.5267443218,-11.04989205,3.4429307567,0.5530365875,0.0830263873,-16.07454951,-0.182901736,1.7781627931,0.5836583249,0.5295528305,5.5661631511 +050,3,7,48,487,Texas,Wilbarger County,13535,13535,13509,13455,13294,13208,12991,13059,12893,12693,12753,12695,12552,-26,-54,-161,-86,-217,68,-166,-200,60,-58,-143,46,165,189,161,149,176,172,147,159,162,164,39,146,147,174,165,162,146,176,157,142,153,7,19,42,-13,-16,14,26,-29,2,20,11,4,20,15,12,14,7,9,3,0,0,3,-38,-93,-225,-84,-221,48,-203,-174,58,-77,-157,-34,-73,-210,-72,-207,55,-194,-171,58,-77,-154,1,0,7,-1,6,-1,2,0,0,-1,0,615,615,619,605,620,640,635,649,647,668,632,632,12.238540276,14.131369397,12.150026413,11.374479942,13.512476008,13.255240444,11.490658954,12.497052582,12.731845332,12.991642571,10.82925382,10.991065087,13.131084446,12.595900607,12.437619962,11.251541307,13.757523646,12.339856952,11.160012575,12.120251911,1.409286456,3.1403043104,-0.981058033,-1.221420665,1.0748560461,2.0036991369,-2.266864692,0.15719563,1.571832757,0.8713906603,1.4834594274,1.1215372537,0.9055920308,1.0687430818,0.537428023,0.6935881628,0.234503244,0,0,0.2376519983,-6.898086337,-16.82305881,-6.339144216,-16.87087293,3.6852207294,-15.64426634,-13.60118815,4.5586732689,-6.051556114,-12.43712124,-5.41462691,-15.70152155,-5.433552185,-15.80212985,4.2226487524,-14.95067818,-13.36668491,4.5586732689,-6.051556114,-12.19946924 +050,3,7,48,489,Texas,Willacy County,22134,22137,22226,22168,22202,22016,21926,21852,21749,21489,21414,21280,21161,89,-58,34,-186,-90,-74,-103,-260,-75,-134,-119,87,343,312,308,291,316,293,276,258,243,242,18,154,159,150,177,180,152,212,176,171,202,69,189,153,158,114,136,141,64,82,72,40,4,8,16,-4,17,17,15,4,-10,-2,4,17,-256,-135,-346,-225,-227,-260,-328,-147,-206,-162,21,-248,-119,-350,-208,-210,-245,-324,-157,-208,-158,-1,1,0,6,4,0,1,0,0,2,-1,3254,3276,3276,3289,3298,3290,3290,3324,3310,3318,3307,3303,15.452538631,14.063556457,13.930978335,13.244731692,14.436474942,13.440058714,12.766547944,12.02713097,11.383332553,11.404066822,6.9378744875,7.1670047329,6.7845673708,8.0560739156,8.2233085111,6.9723171487,9.8061890004,8.2045544601,8.0104932777,9.5190970995,8.5146641438,6.8965517241,7.1464109639,5.1886577762,6.2131664306,6.4677415656,2.9603589435,3.8225765098,3.3728392748,1.8849697227,0.3604090643,0.7212080234,-0.180921797,0.7737472122,0.7766458038,0.6880576134,0.185022434,-0.466167867,-0.09368998,0.1884969723,-11.53309006,-6.085192698,-15.6497354,-10.24077193,-10.37050573,-11.92633196,-15.17183959,-6.852667646,-9.650067925,-7.634127377,-11.17268099,-5.363984674,-15.8306572,-9.467024714,-9.59385993,-11.23827435,-14.98681715,-7.318835513,-9.743757905,-7.445630405 +050,3,7,48,491,Texas,Williamson County,422679,422771,426568,442366,456144,470494,488446,507728,528207,546837,567465,591823,617855,3797,15798,13778,14350,17952,19282,20479,18630,20628,24358,26032,1496,6130,5988,6053,6325,6439,6515,6446,6601,6741,6979,403,1971,2069,2129,2298,2504,2650,2731,2962,3153,3288,1093,4159,3919,3924,4027,3935,3865,3715,3639,3588,3691,160,738,943,984,1315,1610,1361,1330,932,827,697,2340,10823,8660,9252,12251,13538,15171,13518,15996,19974,21763,2500,11561,9603,10236,13566,15148,16532,14848,16928,20801,22460,204,78,256,190,359,199,82,67,61,-31,-119,5097,5104,5006,5217,5257,5362,5279,5254,4260,4317,4194,4187,14.109241899,13.328733125,13.064432929,13.191649113,12.927460464,12.578009238,11.992067301,11.847775558,11.629551932,11.538607795,4.5365931129,4.6054022771,4.5951061795,4.7927920412,5.027234198,5.1161511099,5.0807222774,5.3163325562,5.4395456522,5.4361573906,9.5726487858,8.7233308477,8.469326749,8.3988570713,7.9002262657,7.4618581282,6.911345024,6.531443002,6.1900062797,6.1024504042,1.6986330377,2.0990306174,2.1238067077,2.7426116337,3.2323670363,2.6275779851,2.4743173303,1.6727960643,1.4267377908,1.1523727802,24.910982882,19.276357525,19.968963069,25.551129372,27.179990644,29.289482448,25.148738098,28.710349618,34.459081781,35.981476062,26.60961592,21.375388143,22.092769776,28.293741006,30.41235768,31.917060433,27.623055428,30.383145682,35.885819572,37.133848842 +050,3,7,48,493,Texas,Wilson County,42918,42907,43054,43669,44356,45224,46147,47181,48202,49226,50150,50950,52023,147,615,687,868,923,1034,1021,1024,924,800,1073,104,446,512,464,522,557,532,520,548,530,514,112,345,305,350,361,432,368,383,444,418,456,-8,101,207,114,161,125,164,137,104,112,58,1,6,4,14,24,36,44,32,19,23,23,146,506,471,724,727,864,811,855,802,666,997,147,512,475,738,751,900,855,887,821,689,1020,8,2,5,16,11,9,2,0,-1,-1,-5,551,551,554,547,525,529,525,546,520,497,441,441,10.285622038,11.63305879,10.359455236,11.425944775,11.936396366,11.155027625,10.674549411,11.028819836,10.484668645,9.9831994795,7.9563668231,6.9298494746,7.8142442509,7.9018506966,9.257671867,7.7162597108,7.8622162007,8.935759137,8.2690405539,8.8566905888,2.3292552149,4.7032093155,2.5452109846,3.524094078,2.6787244985,3.4387679146,2.8123332102,2.0930606988,2.215628091,1.1265088907,0.1383715969,0.0908832718,0.31256977,0.5253307942,0.7714726556,0.9225962698,0.6568953484,0.3823860892,0.4549950544,0.4467190429,11.669338007,10.701505254,16.164322393,15.913145309,18.515343734,17.0051267,17.551422589,16.140718081,13.175074184,19.364299379,11.807709604,10.792388526,16.476892163,16.438476103,19.28681639,17.92772297,18.208317937,16.52310417,13.630069238,19.811018422 +050,3,7,48,495,Texas,Winkler County,7110,7106,7081,7160,7366,7631,7818,8028,7917,7595,7743,7970,7887,-25,79,206,265,187,210,-111,-322,148,227,-83,22,116,110,129,136,130,126,111,121,130,133,14,65,73,64,69,65,64,75,68,51,49,8,51,37,65,67,65,62,36,53,79,84,2,10,6,2,10,35,34,21,17,27,13,-38,19,159,194,106,110,-209,-380,77,121,-181,-36,29,165,196,116,145,-175,-359,94,148,-168,3,-1,4,4,4,0,2,1,1,0,1,97,97,97,97,97,97,97,97,97,97,97,97,16.290990801,15.145256781,17.203440688,17.606317561,16.407926291,15.804327375,14.311500774,15.777806754,16.546808375,16.7749259,9.1285724317,10.050943136,8.5350403414,8.9326169979,8.2039631453,8.0275948573,9.6699329551,8.8668666058,6.4914402087,6.180235858,7.1624183695,5.0943136445,8.6684003467,8.6737005631,8.2039631453,7.776732518,4.6415678185,6.9109401487,10.055368166,10.594690042,1.4043957587,0.8261049153,0.2667200107,1.2945821736,4.4175186167,4.264659768,2.7075812274,2.2167166515,3.4366448164,1.6396544113,2.6683519416,21.891780256,25.871841035,13.72257104,13.883629938,-26.21511446,-48.99432697,10.04042248,15.401260103,-22.8290345,4.0727477003,22.717885171,26.138561046,15.017153214,18.301148555,-21.95045469,-46.28674575,12.257139132,18.837904919,-21.18938008 +050,3,7,48,497,Texas,Wise County,59127,59082,59083,59938,60395,60991,61668,62813,64428,65781,68251,69877,71084,1,855,457,596,677,1145,1615,1353,2470,1626,1207,195,782,724,776,774,819,792,726,775,800,794,130,447,518,501,507,551,602,644,608,661,693,65,335,206,275,267,268,190,82,167,139,101,1,20,19,23,25,37,43,23,24,9,16,-67,500,245,303,389,837,1377,1247,2272,1482,1091,-66,520,264,326,414,874,1420,1270,2296,1491,1107,2,0,-13,-5,-4,3,5,1,7,-4,-1,980,980,981,961,981,1002,990,1018,807,804,770,770,13.140538224,12.03327433,12.785658972,12.62035399,13.158634651,12.448817598,11.151302905,11.564402531,11.583458821,11.265527344,7.5112795221,8.6094421314,8.2546586921,8.2668210241,8.8527566456,9.4623588309,9.891789354,9.072460308,9.5708328507,9.8325068636,5.6292587022,3.423832199,4.5310002801,4.3535329654,4.3058780055,2.9864587672,1.2595135513,2.4919422228,2.0126259701,1.4330204808,0.3360751464,0.3157903484,0.3789563871,0.4076341728,0.5944682321,0.6758827736,0.3532781912,0.3581234332,0.1303139117,0.2270131455,8.4018786601,4.0720334405,4.9923384904,6.3427877286,13.447835413,21.64396696,19.153821932,33.902351677,21.458357466,15.479458857,8.7379538065,4.387823789,5.3712948775,6.7504219014,14.042303645,22.319849734,19.507100124,34.26047511,21.588671377,15.706472003 +050,3,7,48,499,Texas,Wood County,41964,41973,41989,42109,42402,42366,42791,43142,43790,44325,45242,45621,46291,16,120,293,-36,425,351,648,535,917,379,670,89,427,396,405,418,424,407,401,399,402,392,160,562,600,635,607,628,612,629,660,627,734,-71,-135,-204,-230,-189,-204,-205,-228,-261,-225,-342,3,0,0,-8,1,10,20,17,11,14,11,85,257,482,203,601,542,832,742,1163,592,1009,88,257,482,195,602,552,852,759,1174,606,1020,-1,-2,15,-1,12,3,1,4,4,-2,-8,1103,1103,1181,1529,1420,1556,1624,1680,1721,1758,1675,1674,10.154819377,9.3715610986,9.5554926387,9.8171612434,9.868153096,9.3636405466,9.1017420417,8.9095314122,8.8484861825,8.5298981635,13.365359462,14.199334998,14.982068705,14.256021231,14.616038076,14.079970552,14.276797367,14.737570757,13.800997106,15.971799112,-3.210540084,-4.827773899,-5.426576066,-4.438859988,-4.74788498,-4.716330005,-5.175055325,-5.828039345,-4.952510923,-7.441900949,0,0,-0.188750472,0.0234860317,0.2327394598,0.4601297566,0.3858593883,0.2456261793,0.3081562352,0.2393593872,6.1119170492,11.406799115,4.7895432239,14.115105041,12.614478722,19.141397874,16.841627419,25.969386046,13.030606518,21.955783793,6.1119170492,11.406799115,4.600792752,14.138591073,12.847218182,19.601527631,17.227486807,26.215012225,13.338762753,22.19514318 +050,3,7,48,501,Texas,Yoakum County,7879,7879,7852,7971,8052,8218,8392,8635,8626,8527,8520,8686,8702,-27,119,81,166,174,243,-9,-99,-7,166,16,39,123,133,155,165,174,163,146,146,187,180,22,55,71,57,62,67,62,56,65,47,49,17,68,62,98,103,107,101,90,81,140,131,-2,14,29,45,61,71,72,49,37,50,38,-45,38,-11,24,11,65,-183,-239,-126,-25,-151,-47,52,18,69,72,136,-111,-190,-89,25,-113,3,-1,1,-1,-1,0,1,1,1,1,-2,53,53,54,54,58,57,56,55,56,54,54,54,15.546988561,16.601135867,19.053472649,19.867549669,20.43812768,18.886507155,17.023261237,17.129113627,21.73660351,20.703933747,6.9519054541,8.8622605005,7.0067609096,7.4653822998,7.8698537617,7.1838248074,6.5294700635,7.6259752449,5.463210508,5.6360708535,8.5950831069,7.7388753667,12.046711739,12.402167369,12.568273918,11.702682347,10.493791174,9.5031383821,16.273393002,15.067862894,1.7695759338,3.6197965425,5.5316533497,7.3449729079,8.3396957773,8.3425062279,5.7132863056,4.3409397548,5.8119260723,4.3708304578,4.8031346774,-1.373026275,2.9502151199,1.3245033113,7.6349327539,-21.20387,-27.86684545,-14.78265971,-2.905963036,-17.36829998,6.5727106111,2.2467702677,8.4818684696,8.6694762191,15.974628531,-12.86136377,-22.15355914,-10.44171995,2.9059630362,-12.99746952 +050,3,7,48,503,Texas,Young County,18550,18550,18523,18354,18273,18353,18267,18154,18095,17916,17953,17937,17904,-27,-169,-81,80,-86,-113,-59,-179,37,-16,-33,62,215,242,241,211,236,220,194,216,179,181,92,239,261,235,279,266,252,288,243,233,246,-30,-24,-19,6,-68,-30,-32,-94,-27,-54,-65,2,-1,-3,2,18,19,21,12,7,10,8,3,-144,-56,72,-35,-101,-49,-96,58,28,24,5,-145,-59,74,-17,-82,-28,-84,65,38,32,-2,0,-3,0,-1,-1,1,-1,-1,0,0,279,279,289,279,274,278,269,257,249,253,267,267,11.660384522,13.214295465,13.160050238,11.52375751,12.9595563,12.138265883,10.774485574,12.043826145,9.974923377,10.100164616,12.96200884,14.251781473,12.832414132,15.237575096,14.606957525,13.90383183,15.995112604,13.549304413,12.984118139,13.727295555,-1.301624319,-1.037486008,0.3276361055,-3.713817586,-1.647401225,-1.765565947,-5.220627031,-1.505478268,-3.009194762,-3.627130939,-0.054234347,-0.16381358,0.1092120352,0.983069361,1.0433541089,1.1586526525,0.6664630252,0.3903091806,0.5572582892,0.4464161156,-7.809745912,-3.057853496,3.931633266,-1.911523758,-5.546250789,-2.703522856,-5.331704201,3.2339903538,1.5603232098,1.3392483469,-7.863980259,-3.221667076,4.0408453012,-0.928454397,-4.50289668,-1.544870203,-4.665241176,3.6242995344,2.117581499,1.7856644625 +050,3,7,48,505,Texas,Zapata County,14018,14018,14086,14223,14267,14375,14359,14474,14420,14251,14151,14221,14172,68,137,44,108,-16,115,-54,-169,-100,70,-49,92,316,275,290,290,301,254,242,228,204,200,11,80,84,90,90,83,92,108,92,106,115,81,236,191,200,200,218,162,134,136,98,85,0,-20,9,-6,-6,16,29,3,-7,5,12,-13,-79,-158,-87,-214,-119,-244,-307,-228,-35,-145,-13,-99,-149,-93,-220,-103,-215,-304,-235,-30,-133,0,0,2,1,4,0,-1,1,-1,2,-1,30,30,30,30,30,29,28,30,31,30,32,32,22.325055636,19.305019305,20.249982543,20.185146516,20.878854091,17.581504811,16.881169126,16.05520738,14.380375018,14.087979432,5.6519128192,5.8968058968,6.284477341,6.2643558154,5.7572919918,6.3681041047,7.533744899,6.4784170129,7.4721556464,8.1005881731,16.673142817,13.408213408,13.965505202,13.920790701,15.121562099,11.213400706,9.3474242266,9.5767903669,6.9082193712,5.9873912584,-1.412978205,0.6318006318,-0.418965156,-0.417623721,1.1098394201,2.0073371634,0.2092706916,-0.492923034,0.352460172,0.8452787659,-5.581263909,-11.09161109,-6.074994763,-14.89524605,-8.254430687,-16.88931958,-21.41536744,-16.05520738,-2.467221204,-10.21378509,-6.994242114,-10.45981046,-6.493959919,-15.31286977,-7.144591267,-14.88198242,-21.20609675,-16.54813041,-2.114761032,-9.368506322 +050,3,7,48,507,Texas,Zavala County,11677,11677,11728,11872,12015,12203,12254,12322,12125,11946,11934,11807,11840,51,144,143,188,51,68,-197,-179,-12,-127,33,36,205,201,211,206,207,188,154,153,167,163,9,73,94,88,95,109,117,110,107,106,87,27,132,107,123,111,98,71,44,46,61,76,12,23,35,26,37,47,41,42,63,0,19,12,-11,3,40,-97,-76,-311,-265,-123,-185,-64,24,12,38,66,-60,-29,-270,-223,-60,-185,-45,0,0,-2,-1,0,-1,2,0,2,-3,2,409,411,410,412,413,412,411,413,413,414,413,412,17.372881356,16.829237661,17.425055744,16.845892791,16.845703125,15.380210251,12.795480038,12.814070352,14.068489112,13.786103946,6.186440678,7.8703897517,7.2673218267,7.7687369669,8.8704427083,9.5717265922,9.1396285987,8.9614740369,8.9296996757,7.3582272593,11.186440678,8.9588479089,10.157733917,9.0771558245,7.9752604167,5.8084836585,3.6558514395,3.8525963149,5.138789436,6.4278766863,1.9491525424,2.9304642693,2.147163267,3.0257186082,3.8248697917,3.3541947887,3.4896763741,5.2763819095,0,1.6069691716,-0.93220339,0.2511826517,3.3033281031,-7.932289324,-6.184895833,-25.44279462,-22.01819617,-10.30150754,-15.58485321,-5.412948788,1.0169491525,3.1816469209,5.4504913701,-4.906570716,-2.360026042,-22.08859983,-18.5285198,-5.025125628,-15.58485321,-3.805979617 +040,4,8,49,000,Utah,Utah,2763885,2763891,2775413,2814797,2854146,2898773,2938327,2983626,3044241,3103540,3155153,3203383,3249879,11522,39384,39349,44627,39554,45299,60615,59299,51613,48230,46496,13749,51933,50438,51860,50825,50999,50845,49487,47581,47576,47611,3677,15011,15470,16268,16291,17263,17788,17856,18274,18011,19080,10072,36922,34968,35592,34534,33736,33057,31631,29307,29565,28531,1019,2900,5272,3545,5513,4148,7669,9255,6112,2616,2189,485,-393,-783,5591,-269,7612,19856,18362,16191,16004,15689,1504,2507,4489,9136,5244,11760,27525,27617,22303,18620,17878,-54,-45,-108,-101,-224,-197,33,51,3,45,87,46152,46298,47150,46574,47149,45815,45303,46010,48089,48079,48588,48669,18.57998179,17.794498904,18.029108354,17.414469514,17.223709813,16.869980708,16.099142113,15.204771987,14.964450937,14.755638311,5.3704601437,5.4578075666,5.6555637234,5.5818814137,5.830171229,5.9019218573,5.8089252041,5.8395578757,5.6651405292,5.9132885043,13.209521646,12.336691337,12.37354463,11.8325881,11.393538584,10.968058851,10.290216909,9.365214111,9.2993104073,8.842349807,1.0375281072,1.859958726,1.2324178387,1.8889517055,1.4008891999,2.5445153319,3.0108424487,1.9531234397,0.8228309158,0.6784165899,-0.140602947,-0.276241973,1.9437089241,-0.092169057,2.5707735269,6.5880683831,5.9735374438,5.173923693,5.0338631408,4.8623471354,0.8969251602,1.5837167528,3.1761267628,1.7967826489,3.9716627268,9.1325837149,8.9843798925,7.1270471327,5.8566940566,5.5407637254 +050,4,8,49,001,Utah,Beaver County,6629,6629,6657,6560,6500,6454,6428,6351,6463,6402,6620,6725,6761,28,-97,-60,-46,-26,-77,112,-61,218,105,36,44,122,114,111,98,110,99,111,94,112,106,7,55,45,62,61,69,60,63,59,47,55,37,67,69,49,37,41,39,48,35,65,51,0,4,-1,4,12,12,23,29,20,15,7,-10,-170,-130,-100,-78,-131,51,-138,162,26,-22,-10,-166,-131,-96,-66,-119,74,-109,182,41,-15,1,2,2,1,3,1,-1,0,1,-1,0,24,24,24,24,24,24,24,24,10,10,37,23,18.461072861,17.457886677,17.137563687,15.215028722,17.215744581,15.45184954,17.256121259,14.437106435,16.785312851,15.720005932,8.3226148143,6.8912710567,9.5723328702,9.4705791026,10.798967055,9.3647572967,9.7940147688,9.0615880817,7.0438366429,8.1566068515,10.138458046,10.56661562,7.5652308167,5.7444496196,6.4167775256,6.0870922429,7.4621064905,5.3755183536,9.7414762083,7.5633990805,0.6052810774,-0.153139357,0.6175698626,1.8630647415,1.878081227,3.5898236304,4.5083560047,3.0717247735,2.2480329712,1.0381135993,-25.72444579,-19.90811639,-15.43924656,-12.10992082,-20.50238673,7.9600437022,-21.45355616,24.880970665,3.8965904833,-3.262642741,-25.11916471,-20.06125574,-14.8216767,-10.24685608,-18.6243055,11.549867333,-16.94520016,27.952695438,6.1446234545,-2.224529141 +050,4,8,49,003,Utah,Box Elder County,49975,49983,50178,50242,50205,50730,51309,51839,52995,53999,54807,55957,57007,195,64,-37,525,579,530,1156,1004,808,1150,1050,229,904,850,859,861,901,886,805,765,871,827,66,331,321,374,350,403,366,397,434,385,409,163,573,529,485,511,498,520,408,331,486,418,8,13,21,-9,3,6,39,56,36,16,16,27,-524,-602,55,71,31,599,542,443,649,617,35,-511,-581,46,74,37,638,598,479,665,633,-3,2,15,-6,-6,-5,-2,-2,-2,-1,-1,339,339,346,339,372,362,357,339,346,336,336,331,18.004381597,16.924348164,17.020855006,16.875900391,17.470043045,16.902913177,15.047572761,14.061724537,15.727131559,14.641832796,6.5923122884,6.3914303065,7.4107098628,6.8601221102,7.8140148137,6.9824675201,7.4209768772,7.9775012407,6.9517171644,7.2412449984,11.412069309,10.532917857,9.6101451429,10.015778281,9.6560282313,9.9204456569,7.6265958839,6.0842232965,8.7754143946,7.4005877979,0.2589125672,0.4181309546,-0.17833259,0.0588010467,0.1163376895,0.7440334243,1.0467876703,0.6617282135,0.2889025315,0.283276088,-10.43616809,-11.9864207,1.0898102739,1.3916247709,0.6010780626,11.427590286,10.131409238,8.1429332941,11.718608934,10.923834142,-10.17725553,-11.56828974,0.9114776837,1.4504258176,0.7174157521,12.17162371,11.178196908,8.8046615076,12.007511466,11.20711023 +050,4,8,49,005,Utah,Cache County,112656,112656,113388,114800,115925,117070,117956,119777,122347,124448,126574,128309,130004,732,1412,1125,1145,886,1821,2570,2101,2126,1735,1695,638,2503,2334,2388,2351,2354,2344,2238,2148,2097,2093,86,501,478,516,507,522,586,538,606,558,601,552,2002,1856,1872,1844,1832,1758,1700,1542,1539,1492,79,196,343,184,278,179,344,453,313,180,149,97,-787,-1081,-910,-1256,-176,469,-47,272,10,44,176,-591,-738,-726,-978,3,813,406,585,190,193,4,1,7,-1,20,-14,-1,-5,-1,6,10,3594,3592,3627,3624,3664,3628,3666,3724,3904,3834,3918,3932,21.938051081,20.231877777,20.498293955,20.006297176,19.803729394,19.361979812,18.136510059,17.114037813,16.454608585,16.20514647,4.3911160973,4.14346083,4.4292795983,4.3144162773,4.3914811995,4.840494953,4.359893839,4.8282620647,4.3784795377,4.6532694831,17.546934983,16.088416947,16.069014357,15.691880898,15.412248194,14.521484859,13.77661622,12.285775749,12.076129047,11.551876986,1.7178817466,2.973236537,1.579433035,2.3656957103,1.5058910627,2.8415192216,3.671063028,2.4938053238,1.4124127541,1.1536391897,-6.897821095,-9.370462672,-7.811326423,-10.68817918,-1.480652665,3.8740480085,-0.380882919,2.1671407287,0.0784673752,0.3406719755,-5.179939348,-6.397226135,-6.231893388,-8.32248347,0.0252383977,6.71556723,3.290180109,4.6609460525,1.4908801293,1.4943111651 +050,4,8,49,007,Utah,Carbon County,21403,21403,21403,21308,21226,20908,20642,20400,20349,20171,20248,20476,20760,0,-95,-82,-318,-266,-242,-51,-178,77,228,284,78,336,334,335,269,267,262,208,241,246,249,80,225,196,243,230,226,233,224,226,192,195,-2,111,138,92,39,41,29,-16,15,54,54,1,10,6,3,25,13,16,26,15,5,5,1,-215,-232,-424,-336,-297,-96,-190,49,170,227,2,-205,-226,-421,-311,-284,-80,-164,64,175,232,0,-1,6,11,6,1,0,2,-2,-1,-2,544,535,524,521,450,445,475,526,505,476,531,526,15.733651752,15.705082992,15.901647126,12.948255114,13.011061839,12.859211269,10.266535044,11.925084737,12.081327964,12.076826074,10.535927513,9.2161564866,11.534627617,11.070998797,11.013108523,11.435863457,11.056268509,11.182859546,9.4293291425,9.4577553594,5.1977242397,6.4889265059,4.3670195092,1.8772563177,1.9979533161,1.4233478122,-0.789733465,0.7422251911,2.6519988213,2.6190707149,0.468263445,0.2821272394,0.1424028101,1.2033694344,0.6334973929,0.7852953447,1.2833168806,0.7422251911,0.2455554464,0.2425065477,-10.06766407,-10.90891992,-20.12626382,-16.1732852,-14.4729789,-4.711772068,-9.378084896,2.424602291,8.3488851783,11.009797265,-9.599400623,-10.62679268,-19.98386101,-14.96991576,-13.83948151,-3.926476723,-8.094768016,3.1668274821,8.5944406247,11.252303812 +050,4,8,49,009,Utah,Daggett County,1059,1061,1077,1162,1096,1141,1125,1107,1075,1012,984,964,1026,16,85,-66,45,-16,-18,-32,-63,-28,-20,62,10,11,9,14,9,11,8,6,8,8,6,0,5,5,9,12,10,15,14,11,3,7,10,6,4,5,-3,1,-7,-8,-3,5,-1,0,0,1,0,1,1,0,0,0,0,0,5,79,-75,38,-14,-20,-26,-54,-25,-25,62,5,79,-74,38,-13,-19,-26,-54,-25,-25,62,1,0,4,2,0,0,1,-1,0,0,1,63,65,64,63,63,72,65,72,0,0,0,0,9.825815096,7.971656333,12.516763523,7.9435127979,9.8566308244,7.3327222731,5.7498802108,8.0160320641,8.2135523614,6.0301507538,4.4662795891,4.4286979628,8.0464908359,10.591350397,8.9605734767,13.748854262,13.416387159,11.022044088,3.0800821355,7.0351758794,5.3595355069,3.5429583702,4.4702726866,-2.647837599,0.8960573477,-6.416131989,-7.666506948,-3.006012024,5.1334702259,-1.005025126,0,0.8857395926,0,0.8826125331,0.8960573477,0,0,0,0,0,70.567217508,-66.43046944,33.974072418,-12.35657546,-17.92114695,-23.83134739,-51.7489219,-25.0501002,-25.66735113,62.311557789,70.567217508,-65.54472985,33.974072418,-11.47396293,-17.02508961,-23.83134739,-51.7489219,-25.0501002,-25.66735113,62.311557789 +050,4,8,49,011,Utah,Davis County,306479,306492,307919,311904,316022,322368,328891,334814,341255,346858,351154,355304,359232,1427,3985,4118,6346,6523,5923,6441,5603,4296,4150,3928,1571,5706,5721,5825,5766,5888,5848,5502,5335,5303,5223,345,1429,1489,1593,1603,1724,1754,1824,1879,1812,1859,1226,4277,4232,4232,4163,4164,4094,3678,3456,3491,3364,99,199,619,279,304,175,266,309,146,38,37,127,-484,-719,1852,2064,1608,2092,1633,701,611,498,226,-285,-100,2131,2368,1783,2358,1942,847,649,535,-25,-7,-14,-17,-8,-24,-11,-17,-7,10,29,3293,3294,3284,3270,3288,2987,3093,3047,2962,3066,3043,2990,18.411707859,18.221892389,18.249032723,17.707240898,17.742822489,17.300009319,15.991559526,15.28627015,15.012923627,14.619277405,4.6109937837,4.7425970576,4.9906796786,4.9227726603,5.1950791391,5.1888194844,5.3014548483,5.3838615955,5.1298166345,5.2033767368,13.800714075,13.479295331,13.258353044,12.784468238,12.54774335,12.111189834,10.690104678,9.9024085546,9.8831069929,9.4159006684,0.6421187984,1.9715698984,0.874073842,0.9335763498,0.52734272,0.7869019286,0.8981083049,0.4183309169,0.107578936,0.1035637113,-1.561736173,-2.290078767,5.8020958975,6.3384920592,4.8455262504,6.1887174238,4.7463134689,2.0085614574,1.7297560506,1.3939115734,-0.919617375,-0.318508869,6.6761697395,7.272068409,5.3728689704,6.9756193525,5.6444217737,2.4268923743,1.8373349867,1.4974752847 +050,4,8,49,013,Utah,Duchesne County,18607,18605,18647,18700,18999,19959,20197,20743,20226,19852,19902,19877,19894,42,53,299,960,238,546,-517,-374,50,-25,17,118,389,424,449,435,442,390,342,345,354,336,19,140,141,149,117,145,162,144,139,151,143,99,249,283,300,318,297,228,198,206,203,193,0,1,7,11,11,6,5,7,5,3,2,-60,-198,13,633,-88,243,-753,-582,-160,-231,-177,-60,-197,20,644,-77,249,-748,-575,-155,-228,-175,3,1,-4,16,-3,0,3,3,-1,0,-1,297,297,297,297,297,297,297,297,293,297,253,283,20.831659839,22.493965357,23.050464603,21.665504532,21.592574499,19.038785423,17.066719896,17.356743975,17.798335805,16.896733801,7.497255469,7.4803045174,7.6492633092,5.8272736328,7.0835368832,7.9084185604,7.1859873247,6.993006993,7.5919454989,7.1911694451,13.33440437,15.01366084,15.401201294,15.838230899,14.509037616,11.130366863,9.8807325715,10.363736982,10.206390306,9.7055643559,0.0535518248,0.3713626356,0.5647107141,0.547863333,0.293111871,0.2440869926,0.3493188283,0.2515470141,0.1508333543,0.1005757964,-10.60326131,0.6896734661,32.49653473,-4.382906664,11.871030777,-36.75950109,-29.04336544,-8.049504452,-11.61416828,-8.900957984,-10.54970948,1.0610361018,33.061245444,-3.835043331,12.164142648,-36.51541409,-28.69404661,-7.797957438,-11.46333493,-8.800382188 +050,4,8,49,015,Utah,Emery County,10976,10976,11004,10986,10941,10761,10641,10360,10221,10027,10039,10061,10147,28,-18,-45,-180,-120,-281,-139,-194,12,22,86,53,179,177,154,134,137,140,107,123,111,121,13,80,83,89,107,79,90,114,103,94,101,40,99,94,65,27,58,50,-7,20,17,20,0,0,0,0,1,1,7,12,4,2,1,-11,-118,-143,-252,-153,-343,-195,-201,-12,3,66,-11,-118,-143,-252,-152,-342,-188,-189,-8,5,67,-1,1,4,7,5,3,-1,2,0,0,-1,43,43,43,43,43,43,43,43,43,43,43,43,16.280127331,16.144479409,14.192240347,12.522194187,13.046997762,13.604781109,10.568945081,12.259543506,11.044776119,11.975455265,7.2760345612,7.5705750901,8.2020090314,9.9990655079,7.5234512642,8.7459307128,11.260371395,10.266121798,9.3532338308,9.9960411718,9.0040927694,8.5739043189,5.9902313151,2.5231286796,5.5235464978,4.858850396,-0.691426314,1.9934217084,1.6915422886,1.9794140934,0,0,0,0.0934492104,0.0952335603,0.6802390554,1.1853022521,0.3986843417,0.1990049751,0.0989707047,-10.73215098,-13.04327997,-23.22366602,-14.29772918,-32.66511119,-18.94951654,-19.85381272,-1.196053025,0.2985074627,6.5320665083,-10.73215098,-13.04327997,-23.22366602,-14.20427997,-32.56987762,-18.26927749,-18.66851047,-0.797368683,0.4975124378,6.631037213 +050,4,8,49,017,Utah,Garfield County,5172,5172,5196,5150,5064,5033,5009,4966,4956,5022,4970,5000,5050,24,-46,-86,-31,-24,-43,-10,66,-52,30,50,21,55,66,63,62,50,55,66,53,52,55,12,51,56,44,56,34,44,44,71,36,35,9,4,10,19,6,16,11,22,-18,16,20,1,6,8,7,10,3,1,2,0,-1,0,14,-57,-107,-59,-41,-64,-20,41,-33,16,31,15,-51,-99,-52,-31,-61,-19,43,-33,15,31,0,1,3,2,1,2,-2,1,-1,-1,-1,171,171,171,171,171,171,171,171,171,174,174,181,10.632128359,12.923438418,12.478954145,12.348137821,10.025062657,11.086474501,13.229104029,10.608486789,10.431293882,10.945273632,9.85888266,10.965341688,8.7154600376,11.153156742,6.8170426065,8.8691796009,8.8194026859,14.211369095,7.221664995,6.9651741294,0.7732456988,1.95809673,3.7634941072,1.1949810795,3.2080200501,2.2172949002,4.409701343,-3.602882306,3.2096288867,3.9800995025,1.1598685482,1.566477384,1.3865504605,1.9916351324,0.6015037594,0.2015722637,0.4008819403,0,-0.200601805,0,-11.01875121,-20.95163501,-11.6866396,-8.165704043,-12.8320802,-4.031445273,8.2180797755,-6.605284227,3.2096288867,6.1691542289,-9.85888266,-19.38515763,-10.30008914,-6.174068911,-12.23057644,-3.829873009,8.6189617158,-6.605284227,3.0090270812,6.1691542289 +050,4,8,49,019,Utah,Grand County,9225,9212,9301,9286,9343,9361,9464,9530,9616,9591,9715,9773,9796,89,-15,57,18,103,66,86,-25,124,58,23,34,132,122,121,131,126,123,111,110,84,97,9,71,91,84,73,89,79,98,90,68,80,25,61,31,37,58,37,44,13,20,16,17,5,1,3,8,18,2,14,16,7,-1,-1,55,-75,23,-26,28,27,27,-53,97,43,7,60,-74,26,-18,46,29,41,-37,104,42,6,4,-2,0,-1,-1,0,1,-1,0,0,0,143,144,144,144,144,144,144,144,148,144,143,143,14.203475547,13.097858178,12.938408896,13.917662683,13.267347583,12.848636791,11.558286042,11.395421113,8.6206896552,9.9136389187,7.6397482111,9.769713887,8.9820359281,7.7556440903,9.3713804359,8.2523764755,10.204612902,9.3235263649,6.9786535304,8.1761970463,6.5637273363,3.3281442912,3.9563729683,6.1620185923,3.8959671475,4.5962603155,1.35367314,2.0718947477,1.6420361248,1.7374418723,0.1076020875,0.3220784798,0.8554319932,1.9123505976,0.2105928188,1.462446464,1.6660592492,0.7251631617,-0.102627258,-0.102202463,-8.070156561,2.4692683451,-2.780153978,2.9747675963,2.8430030536,2.8204324663,-5.518821263,10.048689527,4.4129720854,0.7154172416,-7.962554474,2.7913468248,-1.924721985,4.8871181939,3.0535958724,4.2828789303,-3.852762014,10.773852688,4.3103448276,0.6132147785 +050,4,8,49,021,Utah,Iron County,46163,46163,46264,46632,46661,46560,47080,48166,49755,50944,52959,55269,56814,101,368,29,-101,520,1086,1589,1189,2015,2310,1545,240,879,830,838,827,861,827,860,791,804,825,81,261,292,290,314,287,345,319,341,299,347,159,618,538,548,513,574,482,541,450,505,478,13,20,19,5,-9,-21,31,55,26,-12,-9,-71,-271,-535,-667,24,531,1073,590,1538,1821,1078,-58,-251,-516,-662,15,510,1104,645,1564,1809,1069,0,1,7,13,-8,2,3,3,1,-4,-2,1050,1050,1085,865,906,859,853,859,858,851,1122,1143,18.924388564,17.793403578,17.978781605,17.663391713,18.079499402,16.89116737,17.08060656,15.225739392,14.857523007,14.721233372,5.6191870479,6.2598480057,6.2217740638,6.7065356685,6.0264998005,7.0464966657,6.3357133636,6.5638143268,5.5253723621,6.1918399757,13.305201516,11.533555572,11.757007541,10.956856044,12.052999601,9.8446707039,10.744893197,8.6619250647,9.3321506449,8.529393396,0.4305890458,0.4073188771,0.1072719666,-0.192225545,-0.4409634,0.6331634685,1.092364373,0.5004667815,-0.221754075,-0.160595273,-5.834481571,-11.46924207,-14.31008035,0.5126014524,11.150074544,21.915625862,11.718090547,29.604534999,33.65118084,19.235744939,-5.403892525,-11.06192319,-14.20280838,0.3203759077,10.709111144,22.54878933,12.81045492,30.105001781,33.429426766,19.075149666 +050,4,8,49,023,Utah,Juab County,10246,10246,10263,10317,10300,10269,10418,10560,11045,11308,11639,12002,12122,17,54,-17,-31,149,142,485,263,331,363,120,47,196,179,161,195,170,210,183,190,188,192,16,80,72,64,85,72,57,66,89,68,92,31,116,107,97,110,98,153,117,101,120,100,1,0,-1,-1,-1,8,20,23,14,3,4,-16,-61,-125,-129,41,36,310,125,215,242,17,-15,-61,-126,-130,40,44,330,148,229,245,21,1,-1,2,2,-1,0,2,-2,1,-2,-1,122,122,122,122,122,122,122,121,115,122,122,122,19.047619048,17.364311005,15.654625893,18.852419394,16.207455429,19.439944457,16.373641122,16.559898897,15.904572565,15.917758249,7.7745383868,6.9845273318,6.2229568769,8.2177212742,6.8643340643,5.2765563527,5.9052476178,7.757005273,5.7527177361,7.627259161,11.273080661,10.379783674,9.4316690165,10.63469812,9.3431213652,14.163388105,10.468393504,8.8028936244,10.151854828,8.290499088,0,-0.097007324,-0.097233701,-0.096679074,0.7627037849,1.8514232816,2.0578893213,1.2202030767,0.2537963707,0.3316199635,-5.92808552,-12.12591551,-12.54314745,3.9638420264,3.4321670321,28.697060866,11.184181094,18.738832963,20.472907237,1.409384845,-5.92808552,-12.22292283,-12.64038116,3.8671629526,4.194870817,30.548484147,13.242070416,19.95903604,20.726703608,1.7410048085 +050,4,8,49,025,Utah,Kane County,7125,7125,7214,7297,7177,7128,7172,7045,7306,7535,7663,7873,7914,89,83,-120,-49,44,-127,261,229,128,210,41,16,79,90,74,85,80,87,85,71,80,86,26,60,70,78,88,84,76,66,80,63,80,-10,19,20,-4,-3,-4,11,19,-9,17,6,0,-2,-1,-1,-3,-3,-4,-3,-4,-4,-2,88,66,-142,-46,46,-120,254,211,141,200,37,88,64,-143,-47,43,-123,250,208,137,196,35,11,0,3,2,4,0,0,2,0,-3,0,100,183,185,184,185,184,183,260,262,257,264,255,10.888291641,12.436092303,10.346032856,11.888111888,11.254132377,12.124590621,11.454753723,9.3433346493,10.298661174,10.895040223,8.269588588,9.672516236,10.905277875,12.307692308,11.816838996,10.591596404,8.8942793612,10.527701013,8.1101956746,10.134921138,2.6187030529,2.7635760674,-0.559245019,-0.41958042,-0.562706619,1.5329942164,2.5604743616,-1.184366364,2.1884654995,0.7601190853,-0.275652953,-0.138178803,-0.139811255,-0.41958042,-0.422029964,-0.557452442,-0.404285426,-0.526385051,-0.514933059,-0.253373028,9.0965474468,-19.62139008,-6.431317721,6.4335664336,-16.88119857,35.398230088,28.434741594,18.555073036,25.746652935,4.6874010262,8.8208944938,-19.75956888,-6.571128976,6.013986014,-17.30322853,34.840777646,28.030456169,18.028687985,25.231719876,4.4340279977 +050,4,8,49,027,Utah,Millard County,12503,12503,12541,12571,12468,12556,12540,12621,12641,12805,12941,13100,13327,38,30,-103,88,-16,81,20,164,136,159,227,41,193,184,194,199,196,198,212,183,179,180,24,90,96,109,105,88,118,109,102,85,104,17,103,88,85,94,108,80,103,81,94,76,7,8,8,9,7,6,3,7,0,-5,-1,15,-80,-206,-6,-122,-33,-63,55,56,71,154,22,-72,-198,3,-115,-27,-60,62,56,66,153,-1,-1,7,0,5,0,0,-1,-1,-1,-2,122,133,136,138,138,137,136,138,142,176,177,177,15.371137305,14.697072567,15.50511509,15.859101052,15.579666945,15.67571847,16.662736776,14.215800513,13.747551937,13.622431604,7.1678878624,7.6680378609,8.7116368286,8.3678673892,6.9949525059,9.342094846,8.5671618329,7.9235609415,6.5281671211,7.8707382601,8.2032494425,7.0290347059,6.7934782609,7.4912336627,8.584714439,6.3336236244,8.095574943,6.2922395712,7.2193848163,5.7516933439,0.6371455878,0.6390031551,0.7193094629,0.5578578259,0.4769285799,0.2375108859,0.5501847049,0,-0.384009831,-0.075680176,-6.371455878,-16.45433124,-0.479539642,-9.722664967,-2.62310719,-4.987728604,4.3228798239,4.3501903208,5.4529395953,11.654747039,-5.73431029,-15.81532809,0.239769821,-9.164807141,-2.14617861,-4.750217718,4.8730645288,4.3501903208,5.0689297646,11.579066863 +050,4,8,49,029,Utah,Morgan County,9469,9469,9523,9655,9812,10215,10609,11048,11368,11836,11971,12115,12462,54,132,157,403,394,439,320,468,135,144,347,46,154,135,189,144,176,157,156,155,138,133,18,50,46,64,53,49,61,61,71,62,53,28,104,89,125,91,127,96,95,84,76,80,3,6,21,7,17,8,8,7,3,1,3,22,23,47,268,284,302,217,366,48,69,267,25,29,68,275,301,310,225,373,51,70,270,1,-1,0,3,2,2,-1,0,0,-2,-3,0,0,0,0,0,0,0,0,0,0,0,0,16.060068829,13.86962552,18.874519399,13.830195928,16.253405365,14.007851535,13.445957594,13.021380266,11.458938803,10.823127314,5.2143080613,4.7259464735,6.3913716483,5.0902804456,4.525095812,5.4425410421,5.2577141872,5.964632251,5.1482188823,4.3129755462,10.845760768,9.1436790466,12.483147751,8.7399154821,11.728309553,8.5653104925,8.1882434063,7.0567480153,6.3107199203,6.5101517679,0.6257169674,2.1574973031,0.699056274,1.6327314637,0.738791153,0.7137758744,0.603344251,0.2520267148,0.0830357884,0.2441306913,2.3985817082,4.8286844403,26.763868777,27.276219746,27.889366025,19.361170592,31.546285123,4.0324274373,5.7294694013,21.727631525,3.0242986756,6.9861817435,27.462925051,28.90895121,28.628157178,20.074946467,32.149629374,4.2844541521,5.8125051897,21.971762217 +050,4,8,49,031,Utah,Piute County,1556,1557,1563,1497,1495,1486,1465,1489,1457,1406,1434,1472,1473,6,-66,-2,-9,-21,24,-32,-51,28,38,1,2,18,10,11,19,13,12,9,15,17,20,0,22,17,12,18,11,19,16,25,12,10,2,-4,-7,-1,1,2,-7,-7,-10,5,10,0,0,0,0,0,0,0,0,0,0,0,3,-62,6,-9,-20,23,-24,-45,39,33,-8,3,-62,6,-9,-20,23,-24,-45,39,33,-8,1,0,-1,1,-2,-1,-1,1,-1,0,-1,37,37,37,37,37,37,37,37,37,37,37,37,11.764705882,6.6844919786,7.3800738007,12.876990851,8.8016249154,8.1466395112,6.2871114216,10.563380282,11.699931177,13.582342954,14.379084967,11.363636364,8.0509896008,12.19925449,7.4475287745,12.898845893,11.177086972,17.605633803,8.2587749484,6.7911714771,-2.614379085,-4.679144385,-0.6709158,0.6777363606,1.3540961408,-4.752206382,-4.88997555,-7.042253521,3.4411562285,6.7911714771,0,0,0,0,0,0,0,0,0,0,-40.52287582,4.0106951872,-6.038242201,-13.55472721,15.572105619,-16.29327902,-31.43555711,27.464788732,22.711631108,-5.432937182,-40.52287582,4.0106951872,-6.038242201,-13.55472721,15.572105619,-16.29327902,-31.43555711,27.464788732,22.711631108,-5.432937182 +050,4,8,49,033,Utah,Rich County,2264,2264,2255,2295,2258,2263,2274,2301,2311,2388,2455,2468,2452,-9,40,-37,5,11,27,10,77,67,13,-16,9,37,43,26,32,34,32,31,36,28,29,8,19,9,8,17,20,11,20,13,15,11,1,18,34,18,15,14,21,11,23,13,18,0,0,2,1,2,4,2,2,1,1,1,-9,22,-76,-14,-7,9,-13,65,45,-2,-35,-9,22,-74,-13,-5,13,-11,67,46,-1,-34,-1,0,3,0,1,0,0,-1,-2,1,0,1,1,1,1,1,1,1,1,1,1,1,1,16.263736264,18.88864485,11.501880115,14.106237602,14.863387978,13.876843018,13.194296659,14.866818088,11.375177737,11.788617886,8.3516483516,3.9534372941,3.5390400354,7.493938726,8.7431693989,4.7701647875,8.5124494573,5.3685731984,6.0938452163,4.4715447154,7.9120879121,14.935207555,7.9628400796,6.6122988759,6.1202185792,9.1066782307,4.6818472015,9.4982448895,5.2813325208,7.3170731707,0,0.8785416209,0.4423800044,0.8816398501,1.7486338798,0.8673026886,0.8512449457,0.4129671691,0.4062563478,0.406504065,9.6703296703,-33.38458159,-6.193320062,-3.085739475,3.9344262295,-5.637467476,27.665460736,18.58352261,-0.812512696,-14.22764228,9.6703296703,-32.50603997,-5.750940058,-2.204099625,5.6830601093,-4.770164788,28.516705682,18.996489779,-0.406256348,-13.82113821 +050,4,8,49,035,Utah,Salt Lake County,1029655,1029590,1032997,1047702,1064140,1079661,1090340,1102690,1120751,1137273,1148949,1158585,1165517,3407,14705,16438,15521,10679,12350,18061,16522,11676,9636,6932,4755,18003,17708,18236,17813,17601,17624,17218,16232,16167,16105,1413,5680,6001,6181,6153,6595,6646,6686,6665,6804,7338,3342,12323,11707,12055,11660,11006,10978,10532,9567,9363,8767,573,1888,2997,2261,3370,2552,4703,5641,3880,1845,1491,-419,520,1838,1284,-4166,-1070,2397,370,-1742,-1598,-3394,154,2408,4835,3545,-796,1482,7100,6011,2138,247,-1903,-89,-26,-104,-79,-185,-138,-17,-21,-29,26,68,14006,13953,14093,14015,14412,14461,14326,13710,14847,14816,14660,14737,17.304761525,16.770193982,17.012773107,16.417503955,16.051763998,15.852905474,15.250502209,14.199845859,14.012361248,13.859116338,5.4597036861,5.6831903144,5.7663934292,5.6709651286,6.0145096054,5.9781212994,5.9219919717,5.8305798824,5.8972045482,6.3146970314,11.845057839,11.087003668,11.246379678,10.746538826,10.037254392,9.8747841746,9.3285102373,8.3692659768,8.1151566997,7.5444193069,1.8147747464,2.8382805153,2.1093375738,3.1059893521,2.3273735425,4.2303798482,4.9964039355,3.3942460531,1.5991096989,1.2830762161,0.4998320276,1.7406605229,1.1978723771,-3.839629567,-0.975818844,2.1561174774,0.327720166,-1.523911501,-1.385028346,-2.920697973,2.314606774,4.5789410382,3.3072099509,-0.733640215,1.3515546983,6.3864973255,5.3241241014,1.8703345519,0.2140813526,-1.637621757 +050,4,8,49,037,Utah,San Juan County,14746,14757,14837,14850,15052,15003,15074,15254,15346,15286,15336,15228,15278,80,13,202,-49,71,180,92,-60,50,-108,50,58,219,243,281,240,240,249,197,185,174,180,8,86,96,92,97,98,108,120,124,133,135,50,133,147,189,143,142,141,77,61,41,45,1,9,13,8,18,5,2,2,-1,-3,-2,30,-130,44,-252,-89,34,-50,-139,-9,-145,6,31,-121,57,-244,-71,39,-48,-137,-10,-148,4,-1,1,-2,6,-1,-1,-1,0,-1,-1,1,289,290,289,291,289,363,365,372,359,359,346,336,14.753932698,16.253093439,18.699051738,15.959038468,15.826958586,16.274509804,12.862366153,12.082816276,11.385944248,11.800957189,5.79378179,6.4209751856,6.122109466,6.4501113808,6.462674756,7.0588235294,7.8349438496,8.0987525309,8.7030493391,8.8507178916,8.9601509078,9.832118253,12.576942273,9.5089270871,9.3642838301,9.2156862745,5.0274223035,3.984063745,2.682894909,2.9502392972,0.6063260013,0.8695070564,0.5323573449,1.1969278851,0.3297283039,0.1307189542,0.1305823975,-0.06531252,-0.196309384,-0.131121747,-8.758042241,2.9429469601,-16.76925636,-5.918143432,2.2421524664,-3.267973856,-9.075476626,-0.587812684,-9.488286873,0.3933652396,-8.151716239,3.8124540165,-16.23689902,-4.721215547,2.5718807702,-3.137254902,-8.944894228,-0.653125204,-9.684596257,0.2622434931 +050,4,8,49,039,Utah,Sanpete County,27822,27822,27938,28000,27958,28130,28299,28663,29244,29953,30529,30986,31393,116,62,-42,172,169,364,581,709,576,457,407,105,416,392,383,389,372,382,392,365,382,374,30,183,177,212,173,183,194,203,197,189,206,75,233,215,171,216,189,188,189,168,193,168,5,12,22,20,20,12,23,45,28,14,12,36,-184,-286,-15,-65,165,370,474,380,251,227,41,-172,-264,5,-45,177,393,519,408,265,239,0,1,7,-4,-2,-2,0,1,0,-1,0,2417,2468,2506,2467,2674,2676,2694,2772,2956,2955,2931,2947,14.873610068,14.010507881,13.657110255,13.787237059,13.061339138,13.193568999,13.243914388,12.06970669,12.419735024,11.991214992,6.5429582752,6.3261732013,7.5595492797,6.1315990005,6.425336189,6.7003989155,6.858455665,6.5143348434,6.1448427213,6.6047868674,8.3306517931,7.6843346796,6.0975609756,7.6556380584,6.6360029493,6.4931700831,6.3854587226,5.5553718462,6.2748923027,5.3864281248,0.4290464443,0.7863040137,0.7131650264,0.7088553758,0.4213335206,0.794377191,1.5203473149,0.9258953077,0.4551735349,0.3847448661,-6.578712146,-10.22195218,-0.53487377,-2.303779971,5.7933359081,12.779111334,16.01432505,12.565722033,8.160611233,7.278090383,-6.149665701,-9.435648165,0.1782912566,-1.594924596,6.2146694287,13.573488525,17.534672365,13.491617341,8.6157847679,7.662835249 +050,4,8,49,041,Utah,Sevier County,20802,20800,20799,20872,20662,20758,20746,20872,21145,21299,21516,21636,21780,-1,73,-210,96,-12,126,273,154,217,120,144,89,347,282,277,309,326,305,314,314,273,281,64,204,172,187,198,202,189,203,207,195,223,25,143,110,90,111,124,116,111,107,78,58,0,0,1,1,9,7,2,4,1,0,2,-27,-69,-329,5,-131,-3,156,41,109,44,84,-27,-69,-328,6,-122,4,158,45,110,44,86,1,-1,8,0,-1,-2,-1,-2,0,-2,0,301,297,299,287,293,301,293,301,311,293,286,309,16.654267956,13.579236288,13.375181072,14.890131072,15.666298236,14.517933218,14.79596645,14.667756627,12.65294772,12.944536576,9.7909817379,8.2823710695,9.0294543699,9.5412490362,9.707338171,8.9963586168,9.565545189,9.6695083499,9.0378197998,10.272710521,6.8632862182,5.2968652189,4.3457267021,5.3488820355,5.9589600654,5.5215746008,5.230421261,4.9982482775,3.6151279199,2.6718260549,0,0.0481533202,0.0482858522,0.433693138,0.3363929069,0.0951995621,0.188483649,0.0467126007,0,0.0921319329,-3.311655588,-15.84244234,0.2414292612,-6.312644564,-0.144168389,7.4255658424,1.9319574027,5.0916734789,2.0393029292,3.869541183,-3.311655588,-15.79428902,0.2897151135,-5.878951426,0.1922245182,7.5207654045,2.1204410517,5.1383860796,2.0393029292,3.9616731159 +050,4,8,49,043,Utah,Summit County,36324,36324,36502,37438,37886,38447,39144,39675,40564,41375,41879,42081,42499,178,936,448,561,697,531,889,811,504,202,418,112,476,431,412,411,442,424,432,414,405,392,46,128,116,151,147,141,168,162,128,147,175,66,348,315,261,264,301,256,270,286,258,217,17,46,34,62,125,108,191,180,117,52,46,89,540,106,240,312,127,441,360,103,-110,155,106,586,140,302,437,235,632,540,220,-58,201,6,2,-7,-2,-4,-5,1,1,-2,2,0,116,116,116,116,116,116,116,116,116,114,116,106,12.875304301,11.443895704,10.794806964,10.594012192,11.21556985,10.568426825,10.544429393,9.9454680856,9.6474511672,9.2693308111,3.4622667027,3.080027614,3.9563491544,3.7890992512,3.5778175313,4.187489874,3.9541610222,3.0749273308,3.5016674607,4.1380941121,9.4130375981,8.3638680899,6.8384578099,6.8049129409,7.6377523186,6.3809369509,6.5902683704,6.8705407548,6.1457837065,5.131236699,1.2442520963,0.9027667145,1.6244612422,3.2220231728,2.7404559814,4.7607771782,4.3935122469,2.8106757633,1.2386850881,1.0877275952,14.606437652,2.8145079921,6.2882370665,8.0421698393,3.2225732374,10.992160919,8.7870244938,2.4743555865,-2.620295379,3.6651690707,15.850689748,3.7172747066,7.9126983087,11.264193012,5.9630292188,15.752938097,13.180536741,5.2850313498,-1.381610291,4.7528966659 +050,4,8,49,045,Utah,Tooele County,58218,58218,58502,59198,59810,60655,61473,62676,64643,67490,69946,72110,74512,284,696,612,845,818,1203,1967,2847,2456,2164,2402,267,1001,985,998,982,953,974,960,1003,962,1004,99,311,320,350,319,360,365,377,369,381,402,168,690,665,648,663,593,609,583,634,581,602,2,0,60,23,52,54,65,96,64,40,29,108,7,-101,183,112,558,1289,2159,1754,1546,1785,110,7,-41,206,164,612,1354,2255,1818,1586,1814,6,-1,-12,-9,-9,-2,4,9,4,-3,-14,355,355,355,356,339,320,320,320,320,320,325,326,17.009345794,16.553509008,16.569127962,16.081488275,15.352519956,15.300151588,14.53081365,14.59588463,13.543954497,13.695079865,5.2846219201,5.3777897284,5.8108164197,5.2240272501,5.7994828794,5.7336297018,5.7063716104,5.3697721121,5.3640817706,5.4834881532,11.724723874,11.175719279,10.758311543,10.857461024,9.5530370764,9.566521886,8.8244420395,9.2261125178,8.1798727262,8.211591712,0,1.0083355741,0.3818536504,0.8515655705,0.8699224319,1.0210573442,1.453081365,0.9313425886,0.5631581911,0.395575016,0.1189464741,-1.697364883,3.0382268709,1.8341412289,8.9891984631,20.248352563,32.679194448,25.524607817,21.766064087,24.348324262,0.1189464741,-0.689029309,3.4200805213,2.6857067994,9.8591208951,21.269409907,34.132275813,26.455950406,22.329222279,24.743899278 +050,4,8,49,047,Utah,Uintah County,32588,32589,32465,33246,34648,35696,36934,37815,36261,35235,35407,35806,35970,-124,781,1402,1048,1238,881,-1554,-1026,172,399,164,156,620,662,735,753,728,636,593,529,554,543,30,216,203,224,203,244,244,239,250,260,260,126,404,459,511,550,484,392,354,279,294,283,2,-1,17,12,39,24,19,21,10,-1,-1,-272,376,899,513,637,372,-1974,-1408,-118,105,-118,-270,375,916,525,676,396,-1955,-1387,-108,104,-119,20,2,27,12,12,1,9,7,1,1,0,192,192,192,194,196,192,192,192,192,192,255,276,18.870508743,19.500986832,20.897304674,20.735233375,19.478521452,17.17155354,16.588340606,14.976925908,15.558956932,15.130405707,6.5742417556,5.9799098595,6.3687023769,5.5899765937,6.5285154316,6.5878287165,6.6856887099,7.0779423006,7.3020375493,7.2447614802,12.296266987,13.521076973,14.528602297,15.145256781,12.95000602,10.583724823,9.9026518966,7.8989836075,8.2569193827,7.8856442265,-0.030436304,0.5007806286,0.3411804845,1.0739363899,0.6421490589,0.5129866623,0.5874454515,0.283117692,-0.02808476,-0.027864467,11.444050463,26.482457949,14.585465711,17.540961035,9.9533104122,-53.29661429,-39.38681884,-3.340788766,2.9488997795,-3.288007133,11.413614159,26.983238578,14.926646196,18.614897425,10.595459471,-52.78362763,-38.79937339,-3.057671074,2.9208150197,-3.315871601 +050,4,8,49,049,Utah,Utah County,516564,516639,520033,530844,539970,551689,561171,573289,591107,607612,622076,635675,651059,3394,10811,9126,11719,9482,12118,17818,16505,14464,13599,15384,3251,12122,11548,12175,11815,11921,12018,11801,11601,11668,11840,451,1998,2100,2199,2184,2397,2492,2448,2625,2600,2695,2800,10124,9448,9976,9631,9524,9526,9353,8976,9068,9145,130,434,835,468,805,713,1371,1663,1115,429,380,446,271,-1080,1345,-861,1918,6887,5459,4348,4070,5833,576,705,-245,1813,-56,2631,8258,7122,5463,4499,6213,18,-18,-77,-70,-93,-37,34,30,25,32,26,13912,13978,14611,14222,14039,13095,12501,13602,13963,13989,14220,14075,23.070254654,21.568638438,22.305500161,21.233578348,21.016166282,20.642461843,19.689351716,18.868200714,18.553751895,18.40318201,3.8025382609,3.9222498025,4.0287305835,3.9250220153,4.2257990586,4.2803307466,4.0843600544,4.2693756465,4.134363638,4.1888999591,19.267716393,17.646388635,18.276769577,17.308556332,16.790367223,16.362131096,15.604991662,14.598825068,14.419388257,14.214282051,0.8259767794,1.559561231,0.8574106017,1.4467228582,1.2569857024,2.3548689621,2.7746285827,1.8134681318,0.6821700003,0.5906426659,0.515759694,-2.017157041,2.4641394428,-1.547364448,3.3813444282,11.829308929,9.1080561833,7.0717124994,6.4718692333,9.0663649208,1.3417364734,-0.45759581,3.3215500445,-0.10064159,4.6383301306,14.184177891,11.882684766,8.8851806312,7.1540392335,9.6570075866 +050,4,8,49,051,Utah,Wasatch County,23530,23525,23642,24404,25340,26578,27815,29131,30433,32045,33278,34210,35300,117,762,936,1238,1237,1316,1302,1612,1233,932,1090,77,371,378,412,422,470,440,476,431,415,416,37,124,107,103,129,126,148,140,133,154,160,40,247,271,309,293,344,292,336,298,261,256,10,32,31,79,73,24,84,125,93,43,32,63,482,614,830,848,934,923,1147,840,630,805,73,514,645,909,921,958,1007,1272,933,673,837,4,1,20,20,23,14,3,4,2,-2,-3,250,250,250,250,250,250,250,250,250,250,250,250,15.443533281,15.197812802,15.871181478,15.516702517,16.506866154,14.774024579,15.237363552,13.195964668,12.298482693,11.969500791,5.1617200183,4.302026375,3.9677953696,4.7432574044,4.4252449689,4.969444631,4.4815775153,4.0720726237,4.5637743006,4.6036541505,10.281813262,10.895786427,11.903386109,10.773445112,12.081621185,9.8045799476,10.755786037,9.1238920441,7.7347083926,7.3658466408,1.3320567789,1.2463814731,3.0432605262,2.6841689188,0.8429038036,2.8204956014,4.0014084958,2.8473891279,1.2743006164,0.9207308301,20.064105232,24.686394339,31.973496668,31.180482783,32.803006357,30.991874286,36.716924357,25.718353413,18.669985775,23.162134945,21.396162011,25.932775812,35.016757194,33.864651702,33.645910161,33.812369888,40.718332853,28.565742541,19.944286392,24.082865775 +050,4,8,49,053,Utah,Washington County,138115,138115,138397,141288,144216,147099,151231,154839,159537,166195,172051,177938,184913,282,2891,2928,2883,4132,3608,4698,6658,5856,5887,6975,608,2389,2165,2151,2243,2233,2145,2244,2132,2223,2213,301,1056,1065,1183,1157,1203,1304,1309,1467,1438,1511,307,1333,1100,968,1086,1030,841,935,665,785,702,15,-16,-10,-50,-21,18,144,151,68,-18,-12,-25,1573,1801,1944,3001,2533,3700,5543,5112,5137,6317,-10,1557,1791,1894,2980,2551,3844,5694,5180,5119,6305,-15,1,37,21,66,27,13,29,11,-17,-32,1853,1853,1838,1841,1923,1909,1913,1902,2214,2235,2240,2259,17.083504657,15.166162295,14.767519695,15.03703952,14.591433332,13.646079853,13.778198028,12.606209682,12.703256388,12.197844294,7.5513524143,7.4604909213,8.1217925613,7.7565112459,7.8609468422,8.2957986615,8.0372821829,8.6741602266,8.2174011183,8.3284874508,9.5321522427,7.7056713741,6.6457271339,7.2805282741,6.73048649,5.3502811919,5.7409158449,3.9320494551,4.4858552697,3.8693568434,-0.114414431,-0.070051558,-0.34327103,-0.140783696,0.1176201523,0.9161004657,0.9271425589,0.40207423,-0.102860376,-0.066142852,11.248368701,12.616285586,13.346377632,20.118660544,16.551769203,23.538692521,34.034113934,30.226521526,29.355208307,34.818699687,11.13395427,12.546234028,13.003106603,19.977876848,16.669389355,24.454792987,34.961256493,30.628595756,29.252347931,34.752556835 +050,4,8,49,055,Utah,Wayne County,2778,2778,2772,2742,2704,2712,2695,2689,2671,2699,2657,2703,2759,-6,-30,-38,8,-17,-6,-18,28,-42,46,56,10,33,34,26,34,27,34,26,31,26,24,2,20,26,22,36,27,34,21,25,16,20,8,13,8,4,-2,0,0,5,6,10,4,0,3,1,4,8,9,7,7,4,0,2,-14,-47,-48,-1,-23,-15,-24,17,-53,37,49,-14,-44,-47,3,-15,-6,-17,24,-49,37,51,0,1,1,1,0,0,-1,-1,1,-1,1,9,9,9,9,9,9,9,9,9,9,9,9,11.9695321,12.486228425,9.6011816839,12.576289994,10.029717682,12.686567164,9.6834264432,11.575802838,9.7014925373,8.7879897473,7.2542618789,9.5482923246,8.1240768095,13.316071759,10.029717682,12.686567164,7.8212290503,9.3353248693,5.9701492537,7.3233247895,4.7152702213,2.9379360999,1.4771048744,-0.739781764,0,0,1.8621973929,2.2404779686,3.7313432836,1.4646649579,1.0881392818,0.3672420125,1.4771048744,2.9591270575,3.3432392273,2.6119402985,2.6070763501,1.4936519791,0,0.7323324789,-17.04751542,-17.6276166,-0.369276219,-8.50749029,-5.572065379,-8.955223881,6.3314711359,-19.79088872,13.805970149,17.942145734,-15.95937613,-17.26037459,1.1078286558,-5.548363233,-2.228826152,-6.343283582,8.938547486,-18.29723674,13.805970149,18.674478213 +050,4,8,49,057,Utah,Weber County,231236,231218,232136,233851,236268,238083,240185,242916,247153,251474,255454,259680,262658,918,1715,2417,1815,2102,2731,4237,4321,3980,4226,2978,1064,4043,3988,3962,3797,3870,3936,3802,3681,3655,3661,386,1535,1580,1576,1699,1775,1820,1831,1745,1744,1773,678,2508,2408,2386,2098,2095,2116,1971,1936,1911,1888,47,31,216,150,339,222,283,319,147,-26,-2,193,-820,-157,-689,-287,433,1839,2021,1891,2331,1077,240,-789,59,-539,52,655,2122,2340,2038,2305,1075,0,-4,-50,-32,-48,-19,-1,10,6,10,15,2509,2507,2502,2683,2704,2610,2657,2661,2755,2723,2749,2852,17.352415411,16.96591714,16.704929472,15.878126908,16.02149447,16.063044184,15.24987616,14.522772465,14.190482476,14.0177433,6.5881666227,6.7217023775,6.6448684624,7.1048031648,7.3483598668,7.4275255117,7.3441670828,6.884606887,6.7710537452,6.788707695,10.764248788,10.244214763,10.06006101,8.7733237432,8.6731346033,8.6355186719,7.9057090771,7.6381655778,7.4194287312,7.2290356053,0.133050922,0.9189162744,0.6324430643,1.4176152283,0.9190624735,1.1549394065,1.2795135442,0.5799640186,-0.100944609,-0.007657877,-3.519411486,-0.667915996,-2.905021809,-1.200163925,1.7925858154,7.5050656132,8.1062597894,7.4606255721,9.0500724083,4.1237666032,-3.386360564,0.2510002787,-2.272578744,0.2174513035,2.7116482889,8.6600050197,9.3857733336,8.0405895906,8.9491277998,4.1161087265 +040,1,1,50,000,Vermont,Vermont,625741,625727,625886,627197,626361,626603,625693,625810,624366,625132,624802,624046,623347,159,1311,-836,242,-910,117,-1444,766,-330,-756,-699,1653,6057,6088,5985,6111,5978,5843,5750,5428,5448,5331,1326,5437,5459,5560,5602,5912,5812,6021,6004,5842,6129,327,620,629,425,509,66,31,-271,-576,-394,-798,109,1295,337,432,390,2251,758,1919,551,635,542,-217,-594,-1754,-536,-1721,-2162,-2216,-855,-285,-996,-462,-108,701,-1417,-104,-1331,89,-1458,1064,266,-361,80,-60,-10,-48,-79,-88,-38,-17,-27,-20,-1,19,25329,25330,25333,25327,25443,25413,25379,25207,25201,25593,25686,25691,9.6673564321,9.7131524828,9.5533471033,9.7596734318,9.5533130963,9.3474838743,9.2036962044,8.6852585817,8.7248408133,8.5474265127,8.6777970813,8.709608969,8.874955705,8.9467665791,9.4478399173,9.297890857,9.6374704081,9.6069072447,9.3558223259,9.8268949722,0.9895593508,1.0035435137,0.6783913983,0.8129068527,0.105473179,0.0495930173,-0.433774204,-0.921648663,-0.630981513,-1.279468459,2.0669021924,0.5376695773,0.6895649037,0.6228559382,3.597274637,1.2126292618,3.071633568,0.8816465509,1.0169372093,0.8690124123,-0.948061701,-2.798434536,-0.855571269,-2.748551461,-3.455045653,-3.54510085,-1.36854961,-0.456024078,-1.595070017,-0.740744898,1.1188404918,-2.260764959,-0.166006366,-2.125695522,0.1422289839,-2.332471588,1.7030839585,0.4256224729,-0.578132807,0.1282675147 +050,1,1,50,001,Vermont,Addison County,36821,36809,36813,36973,36910,36949,36950,36955,36973,36947,36970,36994,36851,4,160,-63,39,1,5,18,-26,23,24,-143,89,324,282,328,311,308,316,308,306,294,288,57,311,313,305,312,324,299,338,316,309,349,32,13,-31,23,-1,-16,17,-30,-10,-15,-61,7,177,40,58,16,128,56,100,24,59,47,-32,-29,-71,-38,-6,-105,-55,-94,9,-19,-129,-25,148,-31,20,10,23,1,6,33,40,-82,-3,-1,-1,-4,-8,-2,0,-2,0,-1,0,2852,2852,2851,2851,2853,2855,2856,2855,2864,2871,2965,2965,8.7821537961,7.6336911062,8.8817882722,8.4168933274,8.3350246939,8.5488583487,8.3333333333,8.2795568002,7.9498134227,7.8001218769,8.4297834278,8.4728557314,8.2589799483,8.4439572931,8.7680129896,8.0889514122,9.145021645,8.5501305518,8.3554161484,9.4522310244,0.3523703684,-0.839164625,0.622808324,-0.027063966,-0.432988296,0.4599069365,-0.811688312,-0.270573752,-0.405602726,-1.652109148,4.7976580923,1.0827930647,1.5705601213,0.4330234509,3.4639063663,1.5149875555,2.7056277056,0.6493770039,1.5953707209,1.2729365563,-0.786056976,-1.92195769,-1.028987666,-0.162383794,-2.841485691,-1.487934206,-2.543290043,0.2435163765,-0.513763452,-3.493804591,4.0116011167,-0.839164625,0.5415724556,0.2706396568,0.6224206752,0.0270533492,0.1623376623,0.8928933804,1.0816072684,-2.220868034 +050,1,1,50,003,Vermont,Bennington County,37125,37119,37078,36823,36634,36570,36207,36198,35977,35763,35635,35532,35338,-41,-255,-189,-64,-363,-9,-221,-214,-128,-103,-194,100,316,328,349,344,356,337,323,309,306,303,122,437,417,421,444,437,472,478,459,480,474,-22,-121,-89,-72,-100,-81,-135,-155,-150,-174,-171,3,26,3,-3,6,92,48,102,26,28,32,-19,-159,-103,17,-269,-17,-132,-159,-3,44,-55,-16,-133,-100,14,-263,75,-84,-57,23,72,-23,-3,-1,0,-6,0,-3,-2,-2,-1,-1,0,1475,1475,1475,1475,1474,1473,1473,1482,1449,1425,1472,1473,8.5519817053,8.9303946527,9.5349980875,9.4535361447,9.8335750293,9.3384135781,9.0047393365,8.6557046416,8.5994913373,8.5508677861,11.826632928,11.353581007,11.50210371,12.201657117,12.070989573,13.079321095,13.32589908,12.857503011,13.489398176,13.376605052,-3.274651223,-2.423186354,-1.967105623,-2.748120972,-2.237414543,-3.740907516,-4.321159744,-4.20179837,-4.889906839,-4.825737265,0.7036440644,0.0816804389,-0.081962734,0.1648872583,2.5412609626,1.3301004503,2.8436018957,0.7283117174,0.7868815603,0.9030619444,-4.303054086,-2.804361735,0.4644554942,-7.392445415,-0.46958083,-3.657776238,-4.432673543,-0.084035967,1.2365281661,-1.552137717,-3.599410022,-2.722681297,0.38249276,-7.227558157,2.0716801326,-2.327675788,-1.589071648,0.64427575,2.0234097264,-0.649075773 +050,1,1,50,005,Vermont,Caledonia County,31227,31231,31163,31115,31034,31055,30882,30658,30176,30172,30221,29860,29705,-68,-48,-81,21,-173,-224,-482,-4,49,-361,-155,63,305,282,278,309,272,277,296,265,257,256,93,295,307,306,302,326,320,313,308,312,321,-30,10,-25,-28,7,-54,-43,-17,-43,-55,-65,-1,15,-1,-1,0,15,-3,14,0,0,1,-33,-74,-54,57,-181,-186,-438,1,91,-305,-91,-34,-59,-55,56,-181,-171,-441,15,91,-305,-90,-4,1,-1,-7,1,1,2,-2,1,-1,0,1345,1345,1345,1345,1345,1335,1331,1290,1246,1357,1186,1186,9.794791098,9.0749650035,8.9548873391,9.9778807498,8.8397790055,9.1067495151,9.8097700007,8.775851506,8.5551172584,8.5956518089,9.4736504062,9.8794831775,9.856818438,9.7518446163,10.594735132,10.520432653,10.373168953,10.199857599,10.385978928,10.778141526,0.3211406917,-0.804518174,-0.901931099,0.2260361335,-1.754956126,-1.413683138,-0.563398953,-1.424006093,-1.83086167,-2.182489717,0.4817110376,-0.032180727,-0.032211825,0,0.4874878128,-0.098629056,0.4639756081,0,0,0.0335767649,-2.376441119,-1.737759256,1.8360740228,-5.844648595,-6.044848879,-14.39984219,0.0331411149,3.0135942907,-10.15296017,-3.055485604,-1.894730081,-1.769939983,1.8038621978,-5.844648595,-5.557361066,-14.49847125,0.497116723,3.0135942907,-10.15296017,-3.021908839 +050,1,1,50,007,Vermont,Chittenden County,156545,156535,156774,158083,158777,159578,160134,161535,161839,163254,163755,163918,164306,239,1309,694,801,556,1401,304,1415,501,163,388,414,1524,1579,1580,1615,1556,1590,1521,1332,1447,1389,231,968,1026,1032,1070,1136,1097,1118,1177,1149,1242,183,556,553,548,545,420,493,403,155,298,147,74,771,229,278,305,1539,505,1306,379,398,325,1,-15,-50,2,-260,-545,-694,-292,-28,-539,-97,75,756,179,280,45,994,-189,1014,351,-141,228,-19,-3,-38,-27,-34,-13,0,-2,-5,6,13,9795,9796,9796,9781,9759,9780,9768,9622,9631,10024,10028,10030,9.6805851545,9.9665467399,9.9260259773,10.102842558,9.6745412209,9.8338147161,9.3573223662,8.1465647734,8.8319757807,8.4637320854,6.1488231165,6.4760462034,6.4833283598,6.6935241718,7.0631611999,6.7847136752,6.8780318247,7.1985786324,7.0130892689,7.5680023399,3.531762038,3.4905005365,3.4426976174,3.4093183865,2.6113800211,3.0491010409,2.4792905415,0.9479861411,1.8188865119,0.8957297455,4.8974613872,1.4454333144,1.7464779884,1.9079671705,9.5688425058,3.1233185105,8.0346239384,2.3179790159,2.4292511132,1.9803548796,-0.09528135,-0.315596794,0.0125645898,-1.626463817,-3.388576456,-4.292243656,-1.796409028,-0.171249109,-3.289865201,-0.591059764,4.8021800373,1.1298365209,1.7590425783,0.281503353,6.1802660499,-1.168925145,6.2382149108,2.1467299065,-0.860614088,1.3892951155 +050,1,1,50,009,Vermont,Essex County,6306,6306,6312,6322,6221,6192,6153,6193,6225,6184,6209,6145,6123,6,10,-101,-29,-39,40,32,-41,25,-64,-22,18,61,46,44,57,55,58,46,42,52,43,8,54,55,62,58,61,79,80,73,64,79,10,7,-9,-18,-1,-6,-21,-34,-31,-12,-36,0,1,0,0,2,2,1,1,0,0,0,-3,1,-94,-11,-41,45,53,-8,57,-51,15,-3,2,-94,-11,-39,47,54,-7,57,-51,15,-1,1,2,0,1,-1,-1,0,-1,-1,-1,16,16,16,16,16,16,16,16,16,16,16,16,9.6564825075,7.3347683967,7.0893418191,9.2345078979,8.909768346,9.3412787889,7.4139737287,6.7780198499,8.4183260482,7.010107597,8.548361564,8.7698317787,9.9895271087,9.3965168084,9.8817430747,12.723465937,12.893867354,11.780844025,10.361016675,12.879034888,1.1081209435,-1.435063382,-2.90018529,-0.16200891,-0.971974729,-3.382187148,-5.479893626,-5.002824175,-1.942690627,-5.868927291,0.1583029919,0,0,0.324017821,0.3239915762,0.1610565308,0.1611733419,0,0,0,0.1583029919,-14.98843977,-1.772335455,-6.64236533,7.2898104649,8.5359961346,-1.289386735,9.1987412249,-8.256435163,2.445386371,0.3166059839,-14.98843977,-1.772335455,-6.318347509,7.6138020411,8.6970526655,-1.128213394,9.1987412249,-8.256435163,2.445386371 +050,1,1,50,011,Vermont,Franklin County,47746,47759,47821,48233,48324,48416,48775,49002,48998,48994,49312,49384,49685,62,412,91,92,359,227,-4,-4,318,72,301,146,562,603,574,602,601,582,565,529,552,538,65,389,372,404,378,451,424,431,430,449,430,81,173,231,170,224,150,158,134,99,103,108,1,34,11,29,24,97,15,44,19,49,40,-15,204,-142,-100,123,-15,-175,-180,200,-80,151,-14,238,-131,-71,147,82,-160,-136,219,-31,191,-5,1,-9,-7,-12,-5,-2,-2,0,0,2,529,529,529,551,575,582,585,574,574,568,573,575,11.701751098,12.490031795,11.866859624,12.387978311,12.293279606,11.87755102,11.531553596,10.762313592,11.185863662,10.861116999,8.0996106357,7.7052932465,8.3522844738,7.7784980091,9.2250733813,8.6530612245,8.7966364601,8.7481944134,9.0986463484,8.6808184195,3.6021404627,4.7847385482,3.5145751499,4.6094803017,3.0682062244,3.2244897959,2.7349171361,2.0141191789,2.0872173138,2.1802985798,0.7079351198,0.2278446928,0.5995451726,0.4938728895,1.9841066918,0.306122449,0.8980324924,0.3865481252,0.9929480425,0.8075179925,4.247610719,-2.941267852,-2.067397147,2.5310985585,-0.306820622,-3.571428571,-3.673769287,4.0689276341,-1.621139661,3.0483804217,4.9555458388,-2.713423159,-1.467851974,3.024971448,1.6772860693,-3.265306122,-2.775736795,4.4554757594,-0.628191619,3.8558984142 +050,1,1,50,013,Vermont,Grand Isle County,6970,6970,6948,6975,6973,6990,6969,6873,6921,6976,7100,7208,7169,-22,27,-2,17,-21,-96,48,55,124,108,-39,13,60,58,61,55,68,55,49,63,67,64,28,48,64,50,61,66,65,58,64,44,60,-15,12,-6,11,-6,2,-10,-9,-1,23,4,0,8,1,0,0,0,0,0,0,0,0,-6,7,4,9,-14,-99,58,65,124,85,-42,-6,15,5,9,-14,-99,58,65,124,85,-42,-1,0,-1,-3,-1,1,0,-1,1,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,8.6188321482,8.3166045311,8.7373773544,7.8802206462,9.8251697732,7.9744816587,7.0518817011,8.9514066496,9.3653899916,8.9031091326,6.8950657186,9.1769429309,7.1617847168,8.7398810803,9.5361941916,9.4243874148,8.3471252788,9.0934924695,6.1504053676,8.3466648119,1.7237664296,-0.8603384,1.5755926377,-0.859660434,0.2889755816,-1.449905756,-1.295243578,-0.14208582,3.214984624,0.5564443208,1.1491776198,0.1433897333,0,0,0,0,0,0,0,0,1.0055304173,0.5735589332,1.289121249,-2.005874346,-14.30429129,8.4094533855,9.3545369504,17.61864166,11.881464915,-5.842665368,2.1547080371,0.7169486665,1.289121249,-2.005874346,-14.30429129,8.4094533855,9.3545369504,17.61864166,11.881464915,-5.842665368 +050,1,1,50,015,Vermont,Lamoille County,24475,24473,24517,24717,24957,25127,25149,25265,25360,25427,25330,25420,25341,44,200,240,170,22,116,95,67,-97,90,-79,88,263,249,271,255,274,255,237,232,244,235,65,201,176,180,206,187,217,218,209,192,207,23,62,73,91,49,87,38,19,23,52,28,0,34,9,37,1,29,16,60,17,20,17,21,104,155,45,-24,3,43,-11,-136,19,-123,21,138,164,82,-23,32,59,49,-119,39,-106,0,0,3,-3,-4,-3,-2,-1,-1,-1,-1,694,694,694,694,694,695,696,696,727,772,737,738,10.683673884,10.025365382,10.821819344,10.144005092,10.86999643,10.074074074,9.3330970524,9.141596233,9.6157635468,9.2590768503,8.165089166,7.0862020373,7.1879242872,8.1947648978,7.4185742056,8.5728395062,8.584874082,8.2353172961,7.5665024631,8.1558676937,2.5185847179,2.939163345,3.6338950563,1.9492401941,3.451422224,1.5012345679,0.7482229704,0.9062789369,2.0492610837,1.1032091566,1.3811593614,0.3623626042,1.4775177701,0.0397804121,1.1504740747,0.6320987654,2.3628093804,0.6698583447,0.7881773399,0.6698055594,4.2247227526,6.2406892942,1.7969810718,-0.954729891,0.1190145594,1.6987654321,-0.43318172,-5.358866757,0.7487684729,-4.846240224,5.605882114,6.6030518984,3.2744988419,-0.914949479,1.2694886341,2.3308641975,1.9296276606,-4.689008413,1.5369458128,-4.176434664 +050,1,1,50,017,Vermont,Orange County,28936,28938,28945,29020,28923,28858,28888,28900,28910,28976,28827,28809,28837,7,75,-97,-65,30,12,10,66,-149,-18,28,78,289,277,254,279,260,246,286,248,242,245,70,242,238,251,266,257,256,270,305,276,305,8,47,39,3,13,3,-10,16,-57,-34,-60,0,10,4,12,11,18,7,12,4,6,4,3,19,-139,-75,12,-7,15,42,-95,10,84,3,29,-135,-63,23,11,22,54,-91,16,88,-4,-1,-1,-5,-6,-2,-2,-4,-1,0,0,715,715,715,715,715,715,716,715,719,723,661,661,9.9715345467,9.5611204114,8.7918173794,9.6630069615,8.998407974,8.5106382979,9.8814912069,8.580869505,8.397529322,8.5001561253,8.3498662986,8.2149698842,8.6879770167,9.2127593253,8.8945801897,8.8565992043,9.32868051,10.55308548,9.5773474912,10.581827013,1.6216682481,1.3461505272,0.1038403627,0.4502476362,0.1038277843,-0.345960906,0.5528106969,-1.972215975,-1.179818169,-2.081670888,0.3450357975,0.1380667207,0.415361451,0.3809787691,0.6229667059,0.2421726345,0.4146080227,0.138401121,0.2082032063,0.1387780592,0.6555680152,-4.797818546,-2.596009069,0.4156132026,-0.24226483,0.5189413596,1.4511280793,-3.287026625,0.3470053439,2.914339243,1.0006038126,-4.659751825,-2.180647618,0.7965919717,0.3807018758,0.7611139941,1.865736102,-3.148625504,0.5552085502,3.0531173022 +050,1,1,50,019,Vermont,Orleans County,27231,27234,27247,27198,27169,27141,27032,27043,26748,26822,26826,26934,26897,13,-49,-29,-28,-109,11,-295,74,4,108,-37,76,264,298,258,262,279,242,262,247,254,262,53,284,310,317,294,348,334,329,299,313,319,23,-20,-12,-59,-32,-69,-92,-67,-52,-59,-57,2,37,8,6,2,31,9,32,10,10,8,-9,-63,-21,30,-73,53,-210,110,49,157,13,-7,-26,-13,36,-71,84,-201,142,59,167,21,-3,-3,-4,-5,-6,-4,-2,-1,-3,0,-1,818,818,818,802,796,788,784,779,780,770,778,780,9.6978602259,10.962532419,9.5010127048,9.6727151902,10.319001387,8.997787734,9.7815941758,9.2081717865,9.4494047619,9.7341680444,10.432546607,11.403976677,11.673724913,10.854115519,12.871012483,12.418434311,12.282994213,11.146734268,11.644345238,11.851906894,-0.734686381,-0.441444258,-2.172712208,-1.181400329,-2.552011096,-3.420646577,-2.501400037,-1.938562481,-2.194940476,-2.117738849,1.3591698044,0.2942961723,0.2209537838,0.0738375205,1.1465557097,0.3346284694,1.1946985253,0.3728004772,0.3720238095,0.2972265052,-2.314262099,-0.772527452,1.1047689192,-2.6950695,1.9602404068,-7.80799762,4.1067761807,1.8267223382,5.8407738095,0.4829930709,-0.955092295,-0.47823128,1.325722703,-2.621231979,3.1067961165,-7.473369151,5.301474706,2.1995228154,6.212797619,0.7802195761 +050,1,1,50,021,Vermont,Rutland County,61642,61659,61585,61240,60816,60512,60071,59582,59145,59012,58590,58125,57764,-74,-345,-424,-304,-441,-489,-437,-133,-422,-465,-361,139,544,565,537,591,519,503,509,499,468,453,130,669,645,695,671,680,694,706,734,712,701,9,-125,-80,-158,-80,-161,-191,-197,-235,-244,-248,2,23,8,7,5,34,3,22,2,1,3,-83,-244,-351,-152,-366,-360,-248,46,-187,-222,-118,-81,-221,-343,-145,-361,-326,-245,68,-185,-221,-115,-2,1,-1,-1,0,-2,-1,-4,-2,0,2,2318,2318,2318,2318,2320,2323,2330,2347,2383,2273,2184,2186,8.8581314879,9.2580454873,8.8520374522,9.8023767861,8.6750854554,8.4732200763,8.6156554415,8.4862502338,8.0195347642,7.817825678,10.893547731,10.568919185,11.456547541,11.129263661,11.366200597,11.690685354,11.95020185,12.482780905,12.200659727,12.097783224,-2.035416243,-1.310873697,-2.604510088,-1.326886875,-2.691115141,-3.217465277,-3.334546409,-3.996530671,-4.181124963,-4.279957546,0.3745165886,0.1310873697,0.1153896875,0.0829304297,0.5683100298,0.0505361038,0.3723858933,0.034013027,0.017135758,0.05177368,-3.973132506,-5.751458347,-2.505604642,-6.070507451,-6.017400316,-4.17765125,0.7786250497,-3.180218024,-3.804138286,-2.036431413,-3.598615917,-5.620370977,-2.390214955,-5.987577022,-5.449090286,-4.127115147,1.1510109431,-3.146204997,-3.787002528,-1.984657733 +050,1,1,50,023,Vermont,Washington County,59534,59525,59573,59608,59432,59253,59005,58707,58434,58330,58129,58458,58328,48,35,-176,-179,-248,-298,-273,-104,-201,329,-130,174,613,615,542,566,577,537,527,530,501,489,145,525,500,525,570,550,535,555,549,534,579,29,88,115,17,-4,27,2,-28,-19,-33,-90,5,44,14,3,2,65,12,29,0,0,4,22,-95,-305,-196,-236,-391,-286,-103,-179,361,-48,27,-51,-291,-193,-234,-326,-274,-74,-179,361,-44,-8,-2,0,-3,-10,1,-1,-2,-3,1,4,2410,2410,2410,2410,2410,2409,2413,2398,2406,2407,2962,2960,10.286874586,10.33266129,9.1334203985,9.5722910924,9.8035884192,9.1684380362,9.0267548217,9.1019156957,8.5944402035,8.374291439,8.8101291313,8.4005376344,8.846947803,9.6399397927,9.3448416474,9.1342911534,9.5063546984,9.4282107866,9.1605410552,9.915572072,1.4767454544,1.9321236559,0.2864725955,-0.0676487,0.4587467718,0.0341468828,-0.479599877,-0.326295091,-0.566100852,-1.541280633,0.7383727272,0.2352150538,0.0505539874,0.0338243501,1.1043903765,0.2048812969,0.4967284437,0,0,0.0685013615,-1.594213843,-5.124327957,-3.302860513,-3.991273318,-6.64333288,-4.883004243,-1.764242403,-3.074043226,6.1928002264,-0.822016338,-0.855841116,-4.889112903,-3.252306526,-3.957448968,-5.538942504,-4.678122946,-1.26751396,-3.074043226,6.1928002264,-0.753514976 +050,1,1,50,025,Vermont,Windham County,44513,44511,44506,44261,44029,43928,43708,43309,43251,42955,42690,42227,42015,-5,-245,-232,-101,-220,-399,-58,-296,-265,-463,-212,116,411,407,421,413,362,385,369,357,329,335,92,431,470,436,417,458,452,480,480,439,475,24,-20,-63,-15,-4,-96,-67,-111,-123,-110,-140,4,51,14,5,16,78,31,63,17,18,17,-30,-276,-185,-91,-229,-379,-20,-247,-157,-371,-90,-26,-225,-171,-86,-213,-301,11,-184,-140,-353,-73,-3,0,2,0,-3,-2,-2,-1,-2,0,1,1464,1464,1464,1465,1574,1526,1501,1546,1551,1547,1365,1364,9.2601980466,9.2196171707,9.5728594654,9.4253503127,8.3202132917,8.8955637708,8.5608890332,8.3367388639,7.7487428901,7.9532774625,9.7108159564,10.646732359,9.9139352183,9.5166369985,10.526678695,10.443622921,11.136115816,11.209060657,10.33950799,11.277035208,-0.45061791,-1.427115189,-0.341075753,-0.091286686,-2.206465403,-1.54805915,-2.575226782,-2.872321793,-2.5907651,-3.323757746,1.14907567,0.3171367086,0.1136919176,0.3651467433,1.7927531402,0.7162661738,1.4616152008,0.3969875649,0.42394338,0.4035991548,-6.218527155,-4.190735078,-2.069192901,-5.226162764,-8.71094154,-0.462107209,-5.730459597,-3.666296923,-8.73794411,-2.136701408,-5.069451485,-3.873598369,-1.955500983,-4.861016021,-6.9181884,0.2541589649,-4.268844396,-3.269309358,-8.31400073,-1.733102253 +050,1,1,50,027,Vermont,Windsor County,56670,56658,56604,56629,56162,56034,55770,55590,55409,55320,55208,55032,54988,-54,25,-467,-128,-264,-180,-181,-89,-112,-176,-44,139,521,499,488,452,491,460,452,469,435,431,167,583,566,576,553,631,568,647,601,569,588,-28,-62,-67,-88,-101,-140,-108,-195,-132,-134,-157,12,64,-3,1,0,123,58,134,53,46,44,-34,26,-398,-33,-157,-159,-127,-25,-30,-85,68,-22,90,-401,-32,-157,-36,-69,109,23,-39,112,-4,-3,1,-8,-6,-4,-4,-3,-3,-3,1,898,898,902,904,912,916,910,887,855,840,759,757,9.2022643576,8.8482237058,8.6990623552,8.0855783335,8.8182471264,8.2883629582,8.1640762583,8.486537348,7.8918722787,7.834939102,10.297351479,10.036261758,10.267745731,9.8923115452,11.332614943,10.234326435,11.686188803,10.87507238,10.322931785,10.688965643,-1.095087121,-1.188038053,-1.568683376,-1.806733212,-2.514367816,-1.945963477,-3.522112545,-2.388535032,-2.431059507,-2.854026541,1.1304125123,-0.053195734,0.0178259474,0,2.2090517241,1.04505446,2.4203234925,0.9590330052,0.8345428157,0.7998545719,0.4592300831,-7.057300671,-0.588256266,-2.80848628,-2.855603448,-2.288308904,-0.45155289,-0.542848871,-1.542089985,1.2361388838,1.5896425954,-7.110496405,-0.570430318,-2.80848628,-0.646551724,-1.243254444,1.9687706021,0.4161841343,-0.70754717,2.0359934557 +040,3,5,51,000,Virginia,Virginia,8001024,8001046,8024004,8102437,8187456,8255861,8315430,8367303,8417651,8471011,8510920,8556642,8590563,22958,78433,85019,68405,59569,51873,50348,53360,39909,45722,33921,25723,102350,102773,102491,102559,103221,104026,100149,100976,98870,98147,14652,60455,60213,63446,62616,65251,65337,67942,68844,70037,75821,11071,41895,42560,39045,39943,37970,38689,32207,32132,28833,22326,5990,23466,37768,26352,35428,39097,36646,33741,17189,25830,20721,5544,12941,4483,3111,-16114,-25347,-25020,-12510,-9321,-8892,-9130,11534,36407,42251,29463,19314,13750,11626,21231,7868,16938,11591,353,131,208,-103,312,153,33,-78,-91,-49,4,239836,240554,241319,241373,241639,245121,244985,243173,243314,244874,245407,245393,12.693439303,12.618007988,12.465976299,12.377913103,12.374591142,12.395148655,11.859909329,11.892169389,11.585720327,11.447579941,7.4976245534,7.3926820759,7.7169344847,7.5571661858,7.8225791901,7.7851866618,8.0458712478,8.1079118741,8.207030389,8.8435403904,5.1958147492,5.2253259122,4.7490418144,4.8207469171,4.5520119515,4.6099619933,3.8140380807,3.7842575146,3.3786899383,2.6040395505,2.9102515552,4.636985645,3.2051927236,4.2758286002,4.6871217084,4.3665296908,3.9956984159,2.0243869793,3.0267943365,2.4168370297,1.6049418467,0.5504026331,0.3783908076,-1.944809249,-3.038710744,-2.981241414,-1.481467271,-1.09775502,-1.041976587,-1.064896582,4.5151934019,5.1873882781,3.5835835312,2.3310193515,1.6484109648,1.3852882766,2.5142311451,0.9266319596,1.9848177496,1.3519404474 +050,3,5,51,001,Virginia,Accomack County,33164,33162,33150,33227,33276,32982,32992,32930,32903,32729,32603,32325,32238,-12,77,49,-294,10,-62,-27,-174,-126,-278,-87,89,473,458,344,381,403,389,357,398,333,339,145,466,425,412,409,467,418,377,451,436,478,-56,7,33,-68,-28,-64,-29,-20,-53,-103,-139,5,51,85,67,64,63,81,86,55,59,52,41,20,-60,-293,-20,-55,-76,-238,-126,-232,0,46,71,25,-226,44,8,5,-152,-71,-173,52,-2,-1,-9,0,-6,-6,-3,-2,-2,-2,0,428,428,428,428,429,428,427,430,428,430,429,429,14.251924612,13.773814715,10.383651785,11.550004547,12.226570796,11.817781356,10.87883959,12.183922121,10.257516018,10.501370754,14.041008181,12.781378284,12.436234115,12.398823779,14.168259458,12.698798475,11.488298391,13.806404212,13.430261212,14.807242538,0.2109164319,0.9924364314,-2.05258233,-0.848819232,-1.941688662,-0.881017119,-0.609458801,-1.622482091,-3.172745195,-4.305871784,1.536676861,2.5562756567,2.0223972954,1.9401582442,1.911349777,2.4607719533,2.6206728425,1.6837078308,1.8173977329,1.6108297322,0.6026183768,-1.804429875,-8.844215038,-0.606299451,-1.668638694,-2.30887245,-7.252559727,-3.857221576,-7.146377526,0,2.1392952378,0.7518457814,-6.821817743,1.3338587929,0.2427110828,0.1518995033,-4.631886884,-2.173513745,-5.328979793,1.6108297322 +050,3,5,51,003,Virginia,Albemarle County,98970,98984,99196,100231,101504,102329,103811,105221,106662,108107,108832,109843,110652,212,1035,1273,825,1482,1410,1441,1445,725,1011,809,294,1105,1061,1099,1158,1195,1168,1136,1115,1105,1094,207,697,735,807,770,851,794,848,852,913,973,87,408,326,292,388,344,374,288,263,192,121,65,236,348,302,407,401,492,420,177,330,255,73,393,611,240,691,667,577,739,291,491,428,138,629,959,542,1098,1068,1069,1159,468,821,683,-13,-2,-12,-9,-4,-2,-2,-2,-6,-2,5,6904,6902,6817,6815,6133,6165,6397,6542,6699,6685,6684,6680,11.081749211,10.518749845,10.78333734,11.235082953,11.433656091,11.02495245,10.578807929,10.279387293,10.106322168,9.9231275086,6.9900264257,7.2867871217,7.9182468001,7.4706510139,8.1422940028,7.4947022649,7.8968566227,7.8547425774,8.3502915285,8.8255969523,4.0917227858,3.2319627234,2.8650905398,3.7644319395,3.2913620881,3.5302501852,2.6819513058,2.4246447158,1.7560306391,1.0975305562,2.3667808271,3.4500706372,2.9632100788,3.9487726788,3.8367331318,4.6440724362,3.9111789877,1.6317951129,3.0181776609,2.3129776185,3.941291801,6.0574516073,2.3548689368,6.7041816241,6.3817980022,5.4464020238,6.8818125521,2.6827817958,4.4906825197,3.882174199,6.3080726281,9.5075222445,5.3180790157,10.652954303,10.218531134,10.09047446,10.79299154,4.3145769087,7.5088601806,6.1951518175 +050,3,5,51,005,Virginia,Alleghany County,16250,16264,16203,16163,16035,15926,15613,15432,15393,15143,15016,14898,14701,-61,-40,-128,-109,-313,-181,-39,-250,-127,-118,-197,30,171,151,158,122,146,126,121,149,115,118,76,220,211,238,238,200,196,242,206,222,252,-46,-49,-60,-80,-116,-54,-70,-121,-57,-107,-134,2,4,2,2,-2,-3,1,-2,-3,-2,-1,-15,4,-71,-29,-198,-123,32,-128,-66,-8,-61,-13,8,-69,-27,-200,-126,33,-130,-69,-10,-62,-2,1,1,-2,3,-1,-2,1,-1,-1,-1,281,281,281,281,281,281,281,281,281,281,281,281,10.566644009,9.379464563,9.887049842,7.7364532801,9.4057014012,8.1751824818,7.9250720461,9.880964223,7.6887076285,7.9732423393,13.59451276,13.106404124,14.893151028,15.092425251,12.884522467,12.716950527,15.850144092,13.660930402,14.842548639,17.027602284,-3.027868751,-3.726939561,-5.006101186,-7.355971971,-3.478821066,-4.541768045,-7.925072046,-3.779966179,-7.153841011,-9.054359945,0.2471729593,0.1242313187,0.1251525296,-0.126827103,-0.193267837,0.0648824006,-0.130992926,-0.198945588,-0.133716654,-0.06756985,0.2471729593,-4.410211814,-1.81471168,-12.55588319,-7.923981317,2.0762368208,-8.383547288,-4.376802944,-0.534866618,-4.12176087,0.4943459186,-4.285980496,-1.68955915,-12.6827103,-8.117249154,2.1411192214,-8.514540215,-4.575748533,-0.668583272,-4.189330721 +050,3,5,51,007,Virginia,Amelia County,12690,12690,12741,12747,12741,12655,12713,12784,12805,12974,12997,13058,13014,51,6,-6,-86,58,71,21,169,23,61,-44,39,147,135,138,128,139,140,132,136,138,129,13,128,143,157,119,135,153,149,162,163,181,26,19,-8,-19,9,4,-13,-17,-26,-25,-52,3,15,3,0,0,3,1,1,0,1,1,19,-27,2,-67,51,67,33,183,49,86,7,22,-12,5,-67,51,70,34,184,49,87,8,3,-1,-3,0,-2,-3,0,2,0,-1,0,128,128,128,128,128,128,128,128,128,128,128,128,11.534839925,10.593220339,10.867853205,10.0914538,10.903243519,10.942201727,10.240893751,10.47322013,10.592976396,9.8956735195,10.043942247,11.220966729,12.364151835,9.3818984547,10.589481115,11.958263316,11.559796734,12.47545339,12.511993859,13.884627186,1.4908976773,-0.62774639,-1.49629863,0.7095553453,0.3137624034,-1.016061589,-1.318902983,-2.00223326,-1.919017463,-3.988953667,1.1770244821,0.2354048964,0,0,0.2353218026,0.0781585838,0.0775825284,0,0.0767606985,0.0767106474,-2.118644068,0.1569365976,-5.276421484,4.0208136235,5.2555202573,2.5792332643,14.1976027,3.7734396057,6.6014200729,0.5369745321,-0.941619586,0.392341494,-5.276421484,4.0208136235,5.4908420599,2.6573918481,14.275185228,3.7734396057,6.6781807714,0.6136851795 +050,3,5,51,009,Virginia,Amherst County,32353,32354,32389,32160,32640,32331,32174,31855,31903,31893,31771,31678,31667,35,-229,480,-309,-157,-319,48,-10,-122,-93,-11,86,341,332,305,311,356,332,324,348,314,314,53,361,351,352,301,347,312,353,365,391,423,33,-20,-19,-47,10,9,20,-29,-17,-77,-109,1,2,4,14,13,12,13,12,10,12,10,7,-210,481,-275,-180,-345,18,8,-114,-28,87,8,-208,485,-261,-167,-333,31,20,-104,-16,97,-6,-1,14,-1,0,5,-3,-1,-1,0,1,1538,1534,1544,1908,1814,1777,1366,1481,1432,1395,1404,1401,10.565616818,10.24691358,9.3888042357,9.6426633594,11.119961268,10.414379372,10.157376638,10.932395074,9.8977131239,9.9139632173,11.185301089,10.833333333,10.835603577,9.3326098752,10.838838651,9.7870071207,11.066524547,11.466448856,12.324859336,13.355434525,-0.619684271,-0.586419753,-1.446799341,0.3100534842,0.2811226163,0.6273722513,-0.909147909,-0.534053782,-2.427146212,-3.441471308,0.0619684271,0.1234567901,0.4309615059,0.4030695295,0.3748301551,0.4077919634,0.3761991347,0.3141492837,0.3782565525,0.3157313127,-6.506684844,14.845679012,-8.465315295,-5.580962716,-10.77636696,0.5646350262,0.2507994232,-3.581301835,-0.882598623,2.7468624201,-6.444716417,14.969135802,-8.034353789,-5.177893187,-10.4015368,0.9724269896,0.6269985579,-3.267152551,-0.50434207,3.0625937327 +050,3,5,51,011,Virginia,Appomattox County,14973,15022,15091,15104,15240,15315,15343,15485,15535,15715,15874,15902,16043,69,13,136,75,28,142,50,180,159,28,141,47,148,191,176,173,173,187,172,200,203,200,27,170,153,133,188,177,185,185,184,186,194,20,-22,38,43,-15,-4,2,-13,16,17,6,0,0,0,-2,4,13,14,13,7,11,8,48,36,96,37,40,133,35,182,135,0,128,48,36,96,35,44,146,49,195,142,11,136,1,-1,2,-3,-1,0,-1,-2,1,0,-1,56,56,56,56,56,56,56,56,56,56,56,56,9.8029475079,12.588979699,11.520209458,11.28579816,11.223562995,12.056737589,11.008,12.662635728,12.77693857,12.521521365,11.260142408,10.084365937,8.7056128293,12.264335573,11.483067341,11.927788524,11.84,11.649624869,11.70694864,12.145875724,-1.4571949,2.5046137622,2.814596629,-0.978537413,-0.259504347,0.1289490651,-0.832,1.0130108582,1.0699899295,0.3756456409,0,0,-0.130911471,0.2609433101,0.8433891268,0.9026434558,0.832,0.4431922505,0.692346425,0.5008608546,2.3845007452,6.327445294,2.4218622157,2.6094331007,8.6285195277,2.2566086396,11.648,8.5472791161,0,8.0137736735,2.3845007452,6.327445294,2.2909507446,2.8703764107,9.4719086545,3.1592520954,12.48,8.9904713666,0.692346425,8.5146345281 +050,3,5,51,013,Virginia,Arlington County,207627,207696,209319,216078,221614,225120,226274,228887,231805,235193,236662,238392,240119,1623,6759,5536,3506,1154,2613,2918,3388,1469,1730,1727,816,2989,3129,3260,3141,3139,3274,3038,3022,2765,2732,235,936,897,972,904,960,894,945,898,845,1099,581,2053,2232,2288,2237,2179,2380,2093,2124,1920,1633,438,1652,2329,1670,2412,2506,2470,2296,1240,1811,1437,524,3010,912,-439,-3552,-2077,-1936,-989,-1891,-2004,-1357,962,4662,3241,1231,-1140,429,534,1307,-651,-193,80,80,44,63,-13,57,5,4,-12,-4,3,14,2892,2888,2921,3010,3090,3177,3113,2950,2943,2923,2957,2955,14.052755426,14.297725341,14.594814811,13.916888572,13.792921626,14.21340071,13.010762359,12.80901972,11.64078189,11.418755264,4.4005952087,4.0987726529,4.3515828211,4.0053700315,4.2182875949,3.8811179704,4.0471265402,3.8062540399,3.5574903064,4.5934158253,9.6521602174,10.198952688,10.24323199,9.9115185403,9.5746340306,10.33228274,8.9636358186,9.0027656801,8.0832915837,6.8253394384,7.7668624838,10.642186743,7.4764848881,10.686894376,11.011488243,10.722999314,9.8330185568,5.2558519037,7.6243963844,6.0061315205,14.151486729,4.1673140016,-1.965375369,-15.73791411,-9.126440974,-8.404747641,-4.235564178,-8.015174153,-8.43693559,-5.671760942,21.918349213,14.809500745,5.5111095193,-5.05101973,1.885047269,2.3182516736,5.5974543788,-2.759322249,-0.812539206,0.3343705787 +050,3,5,51,015,Virginia,Augusta County,73750,73759,73593,73656,73599,73862,73908,74324,74875,75324,75906,76120,76544,-166,63,-57,263,46,416,551,449,582,214,424,157,646,705,686,693,662,688,706,717,737,613,159,615,648,708,746,702,686,739,688,769,875,-2,31,57,-22,-53,-40,2,-33,29,-32,-262,0,20,24,17,24,33,55,69,40,60,46,-170,13,-134,277,93,427,497,415,518,186,644,-170,33,-110,294,117,460,552,484,558,246,690,6,-1,-4,-9,-18,-4,-3,-2,-5,0,-4,2708,2619,2550,2483,2450,2426,2645,2796,2885,2919,2913,2915,8.7742531358,9.5752266477,9.3041549969,9.3794410232,8.9319445194,9.2225819208,9.4008615237,9.4822455862,9.6957099444,8.03070796,8.3531976448,8.8010593868,9.6025389764,10.096772011,9.4716390523,9.1957720896,9.8402785638,9.0987237982,10.116690566,11.463082325,0.421055491,0.7741672609,-0.298383979,-0.717330987,-0.539694533,0.0268098312,-0.43941704,0.383521788,-0.420980622,-3.432374365,0.2716487039,0.3259651625,0.2305694387,0.3248291263,0.4452479896,0.737270357,0.9187810838,0.5289955697,0.7893386658,0.6026306136,0.1765716575,-1.819972157,3.75692556,1.2587128646,5.7612391386,6.6622430445,5.5260021705,6.8504926271,2.4469498638,8.4368285909,0.4482203614,-1.494006995,3.9874949987,1.5835419909,6.2064871283,7.3995134016,6.4447832542,7.3794881968,3.2362885296,9.0394592045 +050,3,5,51,017,Virginia,Bath County,4731,4727,4721,4655,4642,4591,4536,4463,4408,4270,4275,4169,4119,-6,-66,-13,-51,-55,-73,-55,-138,5,-106,-50,3,36,31,46,35,48,34,32,36,39,43,4,73,71,59,76,74,59,70,60,69,58,-1,-37,-40,-13,-41,-26,-25,-38,-24,-30,-15,0,3,6,5,3,4,9,7,1,4,5,-5,-31,21,-42,-16,-52,-38,-108,27,-81,-39,-5,-28,27,-37,-13,-48,-29,-101,28,-77,-34,0,-1,0,-1,-1,1,-1,1,1,1,-1,53,53,53,53,53,53,53,53,53,53,53,53,7.6791808874,6.6688178982,9.9642586375,7.669551879,10.667851984,7.6654266712,7.3749711915,8.4259801053,9.2373282804,10.376447876,15.571672355,15.273744219,12.780244774,16.65388408,16.446271808,13.301769812,16.132749481,14.043300176,16.342965419,13.996138996,-7.892491468,-8.60492632,-2.815986137,-8.984332201,-5.778419824,-5.636343141,-8.75777829,-5.61732007,-7.105637139,-3.61969112,0.6399317406,1.290738948,1.083071591,0.6573901611,0.8889876653,2.0290835306,1.6132749481,0.2340550029,0.9474182852,1.2065637066,-6.612627986,4.5175863182,-9.097801365,-3.506080859,-11.55683965,-8.567241574,-24.89052777,6.319485079,-19.18522027,-9.411196911,-5.972696246,5.8083252662,-8.014729774,-2.848690698,-10.66785198,-6.538158043,-23.27725282,6.5535400819,-18.23780199,-8.204633205 +050,3,5,51,019,Virginia,Bedford County,68676,74928,75032,75555,75755,76189,77054,77653,78024,78445,79115,79431,79811,104,523,200,434,865,599,371,421,670,316,380,206,826,736,774,693,686,696,713,742,693,677,204,716,708,803,678,712,808,836,878,781,892,2,110,28,-29,15,-26,-112,-123,-136,-88,-215,7,25,22,19,47,61,59,74,39,52,50,99,391,168,450,794,569,428,475,771,354,549,106,416,190,469,841,630,487,549,810,406,599,-4,-3,-18,-6,9,-5,-4,-5,-4,-2,-4,655,652,607,592,552,555,558,547,544,548,547,545,10.970402492,9.728372216,10.187963987,9.0444588007,8.8683769965,8.9415906011,9.1136263413,9.4186341711,8.7419424016,8.5027819294,9.5094530072,9.3582710991,10.569683568,8.8486912942,9.2044962413,10.380467249,10.685822751,11.14496065,9.8520303256,11.203074566,1.4609494844,0.3701011169,-0.381719581,0.1957675065,-0.336119245,-1.438876648,-1.57219641,-1.726326479,-1.110087924,-2.700292636,0.3320339737,0.2907937347,0.2500921392,0.6134048537,0.7885874589,0.757979663,0.9458742626,0.495049505,0.655961046,0.6279750317,5.1930113489,2.2206067015,5.923234876,10.362626678,7.3558403951,5.4985643351,6.0714901993,9.7867479056,4.465580967,6.8951658482,5.5250453226,2.5114004362,6.1733270152,10.976031532,8.1444278539,6.2565439982,7.017364462,10.281797411,5.121542013,7.5231408799 +050,3,5,51,021,Virginia,Bland County,6824,6826,6801,6776,6693,6674,6586,6536,6483,6361,6295,6292,6239,-25,-25,-83,-19,-88,-50,-53,-122,-66,-3,-53,6,40,47,60,43,46,56,45,36,44,45,24,84,94,95,74,89,84,82,82,68,80,-18,-44,-47,-35,-31,-43,-28,-37,-46,-24,-35,0,-2,0,-1,-2,-2,0,0,0,0,0,-6,21,-35,18,-55,-5,-23,-86,-19,21,-18,-6,19,-35,17,-57,-7,-23,-86,-19,21,-18,-1,0,-1,-1,0,0,-2,1,-1,0,0,686,686,673,686,686,681,686,686,685,676,676,676,5.8923178906,6.9789887891,8.9773322361,6.4856711916,7.0111263527,8.6028112758,7.0071628776,5.6890012642,6.9913402717,7.1821881733,12.37386757,13.957977578,14.214109374,11.161387632,13.565005335,12.904216914,12.76860791,12.958280657,10.804798602,12.76833453,-6.48154968,-6.978988789,-5.236777138,-4.67571644,-6.553878982,-4.301405638,-5.761445033,-7.269279393,-3.81345833,-5.586146357,-0.294615895,0,-0.149622204,-0.301659125,-0.304831581,0,0,0,0,0,3.0934668925,-5.197119311,2.6931996708,-8.295625943,-0.762078951,-3.533297488,-13.39146683,-3.002528445,3.3367760388,-2.872875269,2.798850998,-5.197119311,2.5435774669,-8.597285068,-1.066910532,-3.533297488,-13.39146683,-3.002528445,3.3367760388,-2.872875269 +050,3,5,51,023,Virginia,Botetourt County,33148,33149,33195,33001,33121,32995,33086,33391,33298,33355,33412,33500,33633,46,-194,120,-126,91,305,-93,57,57,88,133,54,250,246,250,271,254,295,248,279,273,255,50,305,308,331,323,322,335,369,342,392,401,4,-55,-62,-81,-52,-68,-40,-121,-63,-119,-146,0,1,0,1,3,19,20,19,7,16,12,47,-142,189,-44,148,354,-71,162,116,193,268,47,-141,189,-43,151,373,-51,181,123,209,280,-5,2,-7,-2,-8,0,-2,-3,-3,-2,-1,275,275,278,287,278,278,299,278,279,287,287,287,7.553326485,7.4407912646,7.5624659689,8.2020550536,7.6417407524,8.8470362429,7.4415255127,8.3574220798,8.1599713056,7.5968599645,9.2150583117,9.3161126403,10.012704943,9.7758811156,9.6875611114,10.046634377,11.072269815,10.244581904,11.716881875,11.946434689,-1.661731827,-1.875321376,-2.450238974,-1.573826062,-2.045820359,-1.199598135,-3.630744303,-1.887159824,-3.556910569,-4.349574725,0.0302133059,0,0.0302498639,0.0907976574,0.5716262768,0.5997990673,0.570116874,0.2096844249,0.4782400765,0.3574992924,-4.290289443,5.7167054838,-1.330994011,4.4793510994,10.650300104,-2.129286689,4.8609965043,3.4747704704,5.768770923,7.9841508647,-4.260076138,5.7167054838,-1.300744147,4.5701487568,11.221926381,-1.529487622,5.4311133782,3.6844548954,6.2470109995,8.3416501572 +050,3,5,51,025,Virginia,Brunswick County,17434,17418,17393,17119,17023,16976,16815,16838,16607,16572,16289,16176,16037,-25,-274,-96,-47,-161,23,-231,-35,-283,-113,-139,36,152,152,145,142,156,133,145,139,139,124,57,194,181,168,218,190,206,239,234,217,242,-21,-42,-29,-23,-76,-34,-73,-94,-95,-78,-118,0,0,3,12,22,16,18,18,7,12,14,-3,-232,-67,-34,-103,43,-176,44,-195,-48,-35,-3,-232,-64,-22,-81,59,-158,62,-188,-36,-21,-1,0,-3,-2,-4,-2,0,-3,0,1,0,2184,2184,2157,2078,2134,2163,2233,2175,2189,2190,2192,2190,8.8085303662,8.9039892215,8.5296626371,8.4046047764,9.2710902446,7.9533562565,8.7404683685,8.4598764493,8.5630679193,7.698755161,11.242466389,10.602776639,9.8826436072,12.902843953,11.291712477,12.318732247,14.406703035,14.241806397,13.368242723,15.024989911,-2.433936022,-1.698787417,-1.35298097,-4.498239176,-2.020622233,-4.36537599,-5.666234667,-5.781929947,-4.805174804,-7.32623475,0,0.1757366294,0.7059031148,1.3021218668,0.9508810507,1.0763940798,1.0850236595,0.4260369435,0.7392576621,0.8692142924,-13.44459898,-3.924784723,-2.000058825,-6.096297831,2.5554928238,-10.52474211,2.6522800567,-11.868172,-2.957030648,-2.173035731,-13.44459898,-3.749048093,-1.29415571,-4.794175964,3.5063738745,-9.448348034,3.7373037162,-11.44213505,-2.217772986,-1.303821439 +050,3,5,51,027,Virginia,Buchanan County,24098,24109,24091,23835,23835,23638,23167,22767,22229,21622,21373,21031,20613,-18,-256,0,-197,-471,-400,-538,-607,-249,-342,-418,61,236,206,232,183,188,168,168,190,179,169,39,294,280,300,273,305,267,332,311,272,308,22,-58,-74,-68,-90,-117,-99,-164,-121,-93,-139,0,10,21,9,17,21,23,24,18,23,19,-41,-208,57,-139,-408,-307,-465,-471,-144,-274,-295,-41,-198,78,-130,-391,-286,-442,-447,-126,-251,-276,1,0,-4,1,10,3,3,4,-2,2,-3,1173,1173,1173,1192,1193,1143,1116,1154,1005,1028,1030,1028,9.8485164629,8.6427522551,9.7739767868,7.8196773849,8.1856576828,7.4673304294,7.6623110077,8.8382370043,8.4425997547,8.1164153299,12.268914577,11.74743025,12.638763086,11.665420361,13.279923368,11.867721575,15.142186039,14.466798465,12.828978398,14.792046873,-2.420398114,-3.104677995,-2.8647863,-3.845742976,-5.094265686,-4.400391146,-7.479875031,-5.628561461,-4.386378644,-6.675631544,0.4173100196,0.8810572687,0.3791628926,0.7264181177,0.9143553795,1.0223130945,1.0946158582,0.8373066636,1.0848033204,0.912496398,-8.680048408,2.391441158,-5.85596023,-17.43403483,-13.36700483,-20.66850387,-21.48183622,-6.698453309,-12.92330912,-14.16770723,-8.262738388,3.2724984267,-5.476797337,-16.70761671,-12.45264945,-19.64619077,-20.38722036,-5.861146645,-11.8385058,-13.25521083 +050,3,5,51,029,Virginia,Buckingham County,17146,17140,17092,17217,17071,17154,16936,17022,17044,17046,17042,17134,17168,-48,125,-146,83,-218,86,22,2,-4,92,34,43,165,155,190,170,145,125,153,156,156,145,54,166,153,139,164,157,157,174,150,164,193,-11,-1,2,51,6,-12,-32,-21,6,-8,-48,0,9,10,2,2,1,1,1,0,1,1,-39,117,-162,32,-230,97,53,24,-9,99,80,-39,126,-152,34,-228,98,54,25,-9,100,81,2,0,4,-2,4,0,0,-2,-1,0,1,2326,2326,2319,2242,2210,2123,2206,2205,2223,2215,2220,2218,9.6184674575,9.0410639291,11.102994887,9.973599296,8.5399611285,7.3386954735,8.9762393664,9.1527810373,9.1292134831,8.4543175325,9.6767611997,8.9244050397,8.1227173119,9.6215899091,9.2467165322,9.2174015147,10.208272221,8.8007509974,9.5973782772,11.252988164,-0.058293742,0.1166588894,2.9802775749,0.3520093869,-0.706755404,-1.878706041,-1.232032854,0.3520300399,-0.468164794,-2.798670631,0.5246436795,0.583294447,0.1168736304,0.1173364623,0.0588962836,0.0587095638,0.0586682312,0,0.0585205993,0.0583056382,6.8203678335,-9.449370042,1.8699780862,-13.49369317,5.7129395135,3.1116068808,1.4080375477,-0.52804506,5.7935393258,4.6644510524,7.345011513,-8.866075595,1.9868517166,-13.3763567,5.7718357972,3.1703164445,1.4667057788,-0.52804506,5.8520599251,4.7227566906 +050,3,5,51,031,Virginia,Campbell County,54842,54815,54910,54799,54843,55093,55286,55374,55391,55440,55526,55371,55304,95,-111,44,250,193,88,17,49,86,-155,-67,162,594,600,560,545,608,580,664,637,623,547,152,497,485,526,529,558,563,585,535,667,619,10,97,115,34,16,50,17,79,102,-44,-72,6,12,36,39,75,80,88,92,38,73,61,80,-217,-101,180,117,-36,-86,-120,-51,-185,-58,86,-205,-65,219,192,44,2,-28,-13,-112,3,-1,-3,-6,-3,-15,-6,-2,-2,-3,1,2,468,468,468,380,468,468,468,438,439,457,459,457,10.828646693,10.944710968,10.187745597,9.8750668152,10.988613772,10.472622218,11.982207144,11.480994178,11.2356511,9.8847978315,9.0603323337,8.8469746995,9.5692039005,9.5851565968,10.084944876,10.16566605,10.556613222,9.6425932268,12.02918023,11.185904676,1.7683143589,2.0977362689,0.618541697,0.2899102184,0.9036688957,0.3069561685,1.4255939223,1.8384009516,-0.793529131,-1.301106844,0.2187605392,0.6566826581,0.7095037113,1.3589541489,1.4458702331,1.5889495779,1.6601853272,0.6848944722,1.3165369667,1.102326632,-3.955919751,-1.84235968,3.2746325135,2.1199684723,-0.650641605,-1.552837088,-2.165459122,-0.919200476,-3.336429299,-1.048113847,-3.737159212,-1.185677022,3.9841362247,3.4789226212,0.7952286282,0.0361124904,-0.505273795,-0.234306004,-2.019892333,0.0542127852 +050,3,5,51,033,Virginia,Caroline County,28545,28550,28631,28672,28950,29253,29747,29907,30091,30441,30766,30745,30860,81,41,278,303,494,160,184,350,325,-21,115,106,386,399,394,439,407,377,358,359,366,338,81,225,226,285,237,255,293,289,301,290,320,25,161,173,109,202,152,84,69,58,76,18,3,10,8,6,16,24,20,16,8,11,11,51,-130,102,183,275,-14,81,263,257,-108,85,54,-120,110,189,291,10,101,279,265,-97,96,2,0,-5,5,1,-2,-1,2,2,0,1,513,513,513,513,513,513,513,513,513,513,513,513,13.472244036,13.848877165,13.538821023,14.881355932,13.64535488,12.56708557,11.828454371,11.730684399,11.900310514,10.973135297,7.8529919899,7.8442261636,9.7933096232,8.0338983051,8.5493009689,9.7669922331,9.5486684729,9.8354763344,9.429207784,10.388767146,5.6192520461,6.0046510014,3.7455113998,6.8474576271,5.0960539109,2.8000933364,2.2797858984,1.8952080644,2.4711027296,0.5843681519,0.3490218662,0.2776717226,0.2061749394,0.5423728814,0.8046400912,0.6666888896,0.5286460054,0.2614080089,0.3576596056,0.3571138706,-4.537284261,3.5403144632,6.2883356528,9.3220338983,-0.469373387,2.700090003,8.6896187141,8.3977322855,-3.511567037,2.759516273,-4.188262395,3.8179861858,6.4945105922,9.8644067797,0.3352667047,3.3667788926,9.2182647195,8.6591402944,-3.153907431,3.1166301437 +050,3,5,51,035,Virginia,Carroll County,30042,30072,30071,30093,29920,29915,29721,29882,29788,29845,29824,30022,30074,-1,22,-173,-5,-194,161,-94,57,-21,198,52,56,247,271,257,254,293,236,237,256,235,240,71,332,357,377,391,361,359,357,348,331,399,-15,-85,-86,-120,-137,-68,-123,-120,-92,-96,-159,-1,1,1,11,15,35,57,55,20,44,37,19,107,-81,106,-69,198,-27,126,54,251,174,18,108,-80,117,-54,233,30,181,74,295,211,-4,-1,-7,-2,-3,-4,-1,-4,-3,-1,0,337,337,337,337,337,337,337,337,337,337,337,337,8.2108902334,9.0313765351,8.5902899641,8.5183446241,9.8317198799,7.9101726161,7.9486190532,8.5806700297,7.8534906259,7.9872204473,11.036500233,11.897422225,12.601320297,13.112884835,12.113484221,12.032847327,11.973236295,11.664348322,11.061725094,13.278753994,-2.825609999,-2.86604569,-4.011030333,-4.594540211,-2.281764341,-4.122674711,-4.024617242,-3.083678292,-3.208234468,-5.291533546,0.0332424706,0.0333261127,0.3676777806,0.5030518479,1.1744375283,1.9105077929,1.844616236,0.6703648461,1.470440798,1.2313631523,3.5569443521,-2.699415127,3.5430767945,-2.3140385,6.6439608745,-0.904977376,4.2258481042,1.8099850844,8.3881963707,5.7907348243,3.5901868227,-2.666089014,3.9107545751,-1.810986652,7.8183984028,1.0055304173,6.0704643402,2.4803499304,9.8586371687,7.0220979766 +050,3,5,51,036,Virginia,Charles City County,7256,7252,7255,7200,7123,7068,6975,7043,7026,7024,6983,6969,6821,3,-55,-77,-55,-93,68,-17,-2,-41,-14,-148,25,47,58,50,61,76,54,52,58,60,52,36,85,72,79,67,57,85,85,103,79,116,-11,-38,-14,-29,-6,19,-31,-33,-45,-19,-64,0,0,0,0,2,1,0,0,0,0,0,14,-17,-64,-25,-89,48,15,31,5,4,-83,14,-17,-64,-25,-87,49,15,31,5,4,-83,0,0,1,-1,0,0,-1,0,-1,1,-1,0,0,0,0,0,0,0,0,0,0,0,0,6.5029401591,8.0988619703,7.046719752,8.6876023642,10.843201598,7.6764517734,7.4021352313,8.281573499,8.6009174312,7.5416968818,11.760636458,10.053759687,11.133817208,9.5421206295,8.1324011985,12.083303717,12.099644128,14.706932248,11.324541284,16.823785352,-5.257696299,-1.954897717,-4.087097456,-0.854518265,2.7108003995,-4.406851944,-4.697508897,-6.425358749,-2.723623853,-9.28208847,0,0,0,0.2848394218,0.1426737052,0,0,0,0,0,-2.352127292,-8.936675278,-3.523359876,-12.67535427,6.8483378513,2.1323477148,4.4128113879,0.7139287499,0.5733944954,-12.03770848,-2.352127292,-8.936675278,-3.523359876,-12.39051485,6.9910115566,2.1323477148,4.4128113879,0.7139287499,0.5733944954,-12.03770848 +050,3,5,51,037,Virginia,Charlotte County,12586,12597,12568,12497,12400,12281,12177,12182,12113,12078,11906,11849,11820,-29,-71,-97,-119,-104,5,-69,-35,-172,-57,-29,25,128,140,154,129,144,123,127,131,122,131,49,150,158,167,158,131,159,165,182,156,181,-24,-22,-18,-13,-29,13,-36,-38,-51,-34,-50,0,5,0,0,-1,10,8,9,5,8,6,-2,-53,-77,-107,-72,-18,-40,-6,-125,-31,14,-2,-48,-77,-107,-73,-8,-32,3,-120,-23,20,-3,-1,-2,1,-2,0,-1,0,-1,0,1,175,175,175,175,175,175,175,175,175,175,175,175,10.213445043,11.2463349,12.479235039,10.548695723,11.823145449,10.125540235,10.499772643,10.9239493,10.271521785,11.069331193,11.96888091,12.692292244,13.532676958,12.92010794,10.755778152,13.089112986,13.641436898,15.176784523,13.134077036,15.294266762,-1.755435867,-1.445957344,-1.053441919,-2.371412217,1.0673672975,-2.963572752,-3.141664255,-4.252835223,-2.862555252,-4.22493557,0.398962697,0,0,-0.081772835,0.8210517673,0.6585717226,0.7440783763,0.4169446298,0.6735424121,0.5069922684,-4.229004588,-6.185484195,-8.670637332,-5.887644125,-1.477893181,-3.292858613,-0.496052251,-10.42361574,-2.609976847,1.1829819595,-3.830041891,-6.185484195,-8.670637332,-5.96941696,-0.656841414,-2.63428689,0.2480261254,-10.00667111,-1.936434435,1.6899742279 +050,3,5,51,041,Virginia,Chesterfield County,316236,316236,317210,320344,323942,327721,332221,335093,338677,343500,348704,353376,358245,974,3134,3598,3779,4500,2872,3584,4823,5204,4672,4869,1041,3725,3681,3724,3769,3828,3971,3946,3976,4078,3970,512,1944,2055,2165,2141,2403,2401,2457,2572,2868,2954,529,1781,1626,1559,1628,1425,1570,1489,1404,1210,1016,147,465,765,551,634,798,670,667,338,476,412,329,897,1269,1715,2279,673,1364,2690,3477,2994,3453,476,1362,2034,2266,2913,1471,2034,3357,3815,3470,3865,-31,-9,-62,-46,-41,-24,-20,-23,-15,-8,-12,4651,4621,4771,5294,5019,4752,4454,4302,4265,4566,4577,4579,11.685284697,11.426602472,11.429220318,11.422215892,11.472859853,11.787405198,11.568845036,11.487942861,11.616909754,11.157624634,6.0983069669,6.379154599,6.6445386649,6.4884489849,7.2020068513,7.1270611633,7.2034090859,7.4313352711,8.1700091158,8.3021720832,5.5869777305,5.0474478725,4.7846816529,4.9337669068,4.2708530017,4.6603440343,4.3654359499,4.0566075897,3.4469006381,2.8554525513,1.4586999689,2.374721785,1.6910581083,1.9213809698,2.391677681,1.9888092376,1.9555042166,0.976590716,1.3559708295,1.1579197354,2.8138792949,3.9392443728,5.2634567253,6.9066675556,2.0170414527,4.0488594031,7.886516256,10.04617136,8.5289425706,9.7046039957,4.2725792639,6.3139661579,6.9545148336,8.8280485255,4.4087191337,6.0376686406,9.8420204727,11.022762076,9.8849134002,10.862523731 +050,3,5,51,043,Virginia,Clarke County,14034,14028,14018,14197,14255,14264,14329,14252,14309,14468,14517,14576,14622,-10,179,58,9,65,-77,57,159,49,59,46,28,129,115,124,144,114,128,133,107,121,128,58,150,150,142,141,136,150,175,143,166,164,-30,-21,-35,-18,3,-22,-22,-42,-36,-45,-36,1,2,6,3,2,-5,6,9,8,7,6,18,197,88,26,64,-53,75,191,79,98,75,19,199,94,29,66,-58,81,200,87,105,81,1,1,-1,-2,-4,3,-2,1,-2,-1,1,255,255,276,276,247,255,180,180,180,180,180,180,9.144072302,8.0837902432,8.6959570812,10.072395342,7.9773275953,8.9632715941,9.2434930674,7.3831292048,8.3181521328,8.7677238167,10.632642212,10.54407423,9.9582734317,9.8625537719,9.516811868,10.503833899,12.162490878,9.8671726755,11.411679786,11.23364614,-1.48856991,-2.460283987,-1.262316351,0.2098415696,-1.539484273,-1.540562305,-2.918997811,-2.484043471,-3.093527653,-2.465922323,0.1417685628,0.4217629692,0.2103860584,0.1398943797,-0.349882789,0.420153356,0.6254995309,0.5520096602,0.4812154126,0.4109870539,13.964203438,6.1858568818,1.8233458396,4.4766201518,-3.708757566,5.2519169497,13.274490044,5.4510953942,6.737015777,5.1373381738,14.105972001,6.607619851,2.033731898,4.6165145315,-4.058640355,5.6720703057,13.899989575,6.0031050543,7.2182311896,5.5483252278 +050,3,5,51,045,Virginia,Craig County,5190,5175,5198,5170,5139,5138,5177,5140,5138,5070,5105,5127,5077,23,-28,-31,-1,39,-37,-2,-68,35,22,-50,9,28,38,48,45,35,55,35,44,35,41,3,52,48,63,42,48,61,51,52,46,75,6,-24,-10,-15,3,-13,-6,-16,-8,-11,-34,0,0,0,0,0,0,0,-1,-1,-1,0,16,-4,-21,13,38,-24,3,-50,44,34,-15,16,-4,-21,13,38,-24,3,-51,43,33,-15,1,0,0,1,-2,0,1,-1,0,0,-1,9,9,9,9,9,9,9,9,9,9,9,9,5.4012345679,7.3721990494,9.3412474458,8.7251575376,6.7849180963,10.702471298,6.8573667712,8.6486486486,6.8412822518,8.0360642885,10.030864198,9.3122514308,12.260387273,8.1434803684,9.3050305321,11.870013621,9.9921630094,10.221130221,8.9913995309,14.700117601,-4.62962963,-1.940052381,-2.919139827,0.5816771692,-2.520112436,-1.167542323,-3.134796238,-1.572481572,-2.150117279,-6.664053312,0,0,0,0,0,0,-0.195924765,-0.196560197,-0.195465207,0,-0.771604938,-4.074110001,2.5299211832,7.3679108095,-4.652515266,0.5837711617,-9.796238245,8.6486486486,6.6458170446,-2.94002352,-0.771604938,-4.074110001,2.5299211832,7.3679108095,-4.652515266,0.5837711617,-9.992163009,8.4520884521,6.4503518374,-2.94002352 +050,3,5,51,047,Virginia,Culpeper County,46689,46687,46834,47347,47850,48609,49243,49559,50337,51261,51785,52722,53569,147,513,503,759,634,316,778,924,524,937,847,176,599,624,639,630,632,638,640,624,653,651,108,373,347,391,422,391,424,437,476,461,484,68,226,277,248,208,241,214,203,148,192,167,7,27,25,45,82,100,111,116,76,98,85,72,261,210,461,346,-17,452,602,301,649,597,79,288,235,506,428,83,563,718,377,747,682,0,-1,-9,5,-2,-8,1,3,-1,-2,-2,1761,1761,1761,1658,1645,1535,1408,1428,1470,1476,1476,1475,12.720187724,13.109656817,13.24915249,12.876589135,12.793263294,12.773284216,12.598673202,12.111096015,12.496770551,12.249390823,7.9209182319,7.2901456979,8.1070713982,8.6252708172,7.9148195381,8.4888283815,8.6025315459,9.2385924733,8.8223755347,9.1070739762,4.7992694917,5.819511119,5.1420810914,4.2513183175,4.8784437562,4.2844558341,3.9961416563,2.8725035421,3.6743950166,3.1423168471,0.5733640543,0.5252266353,0.9330389077,1.6760004905,2.0242505212,2.2223112037,2.2835095179,1.4750693865,1.8754724564,1.5993828264,5.5425191918,4.4119037365,9.5584652547,7.0719045089,-0.344122589,9.0494113878,11.850626981,5.8420511228,12.420220655,11.233312322,6.1158832461,4.9371303718,10.491504162,8.7479049994,1.6801279326,11.271722591,14.134136499,7.3171205093,14.295693111,12.832695148 +050,3,5,51,049,Virginia,Cumberland County,10052,10039,10028,9987,9845,9852,9843,9758,9742,9840,9863,9967,9933,-11,-41,-142,7,-9,-85,-16,98,23,104,-34,30,108,117,104,106,104,95,102,87,117,93,35,84,82,106,102,71,106,96,101,81,121,-5,24,35,-2,4,33,-11,6,-14,36,-28,0,0,-1,0,0,0,0,0,0,0,0,-4,-67,-180,10,-11,-119,-4,91,39,68,-7,-4,-67,-181,10,-11,-119,-4,91,39,68,-7,-2,2,4,-1,-2,1,-1,1,-2,0,1,37,37,37,37,37,37,37,37,37,37,37,37,10.79190607,11.799112545,10.559983754,10.764153338,10.611703485,9.7435897436,10.417730569,8.8311424656,11.800302572,9.3467336683,8.3937047215,8.2694634933,10.763060365,10.357958873,7.2445283404,10.871794872,9.8049228884,10.252245851,8.1694402421,12.16080402,2.398201349,3.529649052,-0.203076611,0.4061944656,3.3671751441,-1.128205128,0.6128076805,-1.421103385,3.6308623298,-2.814070352,0,-0.100847116,0,0,0,0,0,0,0,0,-6.694978766,-18.15248084,1.0153830533,-1.11703478,-12.14223764,-0.41025641,9.2942498213,3.9587880018,6.8582955119,-0.703517588,-6.694978766,-18.25332795,1.0153830533,-1.11703478,-12.14223764,-0.41025641,9.2942498213,3.9587880018,6.8582955119,-0.703517588 +050,3,5,51,051,Virginia,Dickenson County,15903,15877,15846,15778,15708,15527,15345,15200,15019,14728,14502,14295,14078,-31,-68,-70,-181,-182,-145,-181,-291,-226,-207,-217,38,178,185,174,144,150,138,132,132,113,115,77,194,212,198,206,223,206,207,212,182,202,-39,-16,-27,-24,-62,-73,-68,-75,-80,-69,-87,1,3,2,2,2,0,1,1,0,1,0,9,-55,-43,-162,-124,-70,-112,-220,-145,-139,-130,10,-52,-41,-160,-122,-70,-111,-219,-145,-138,-130,-2,0,-2,3,2,-2,-2,3,-1,0,0,335,339,379,414,443,443,512,562,511,512,510,512,11.257272957,11.751254526,11.141347847,9.3288416688,9.8215747258,9.133326715,8.8748445221,9.0318166268,7.8480397264,8.1062982413,12.269162661,13.466302484,12.678085481,13.345426276,14.601407759,13.633806546,13.917369819,14.505644885,12.640205577,14.238889085,-1.011889704,-1.715047958,-1.536737634,-4.016584607,-4.779833033,-4.500479831,-5.042525297,-5.473828259,-4.792165851,-6.132590843,0.1897293195,0.1270405895,0.1280614695,0.1295672454,0,0.0661835269,0.0672336706,0,0.069451679,0,-3.478370858,-2.731372674,-10.37297903,-8.033169215,-4.583401539,-7.412555015,-14.79140754,-9.921313719,-9.65378338,-9.16364149,-3.288641538,-2.604332084,-10.24491756,-7.903601969,-4.583401539,-7.346371488,-14.72417387,-9.921313719,-9.584331701,-9.16364149 +050,3,5,51,053,Virginia,Dinwiddie County,28001,28011,28062,28114,28222,28087,28090,28146,28458,28678,28800,28804,28688,51,52,108,-135,3,56,312,220,122,4,-116,70,303,317,332,274,316,305,325,294,306,233,35,245,218,293,261,233,244,269,300,295,315,35,58,99,39,13,83,61,56,-6,11,-82,4,16,22,25,38,24,12,9,3,3,2,15,-20,-9,-200,-46,-48,240,156,128,-12,-36,19,-4,13,-175,-8,-24,252,165,131,-9,-34,-3,-2,-4,1,-2,-3,-1,-1,-3,2,0,919,940,938,1008,936,940,955,985,996,862,864,864,10.787524922,11.253905141,11.792075867,9.7548818912,11.238352657,10.77662356,11.376365164,10.230001044,10.624262204,8.1054755444,8.7225861578,7.739278614,10.406862136,9.2920590277,8.2865068639,8.6212988481,9.4161299356,10.438776575,10.242344282,10.958046337,2.0649387639,3.5146265266,1.3852137314,0.4628228634,2.9518457927,2.155324712,1.9602352282,-0.208775532,0.3819179224,-2.852570792,0.5696382797,0.781028117,0.8879575201,1.3528668316,0.8535457714,0.423998304,0.3150378045,0.1043877658,0.1041594334,0.0695748974,-0.71204785,-0.319511502,-7.103660161,-1.637680901,-1.707091543,8.4799660801,5.4606552786,4.4538780055,-0.416637733,-1.252348153,-0.14240957,0.4615166146,-6.215702641,-0.28481407,-0.853545771,8.9039643841,5.7756930832,4.5582657713,-0.3124783,-1.182773255 +050,3,5,51,057,Virginia,Essex County,11151,11149,11145,11168,11133,11158,11066,11091,11073,10960,10889,10936,10943,-4,23,-35,25,-92,25,-18,-113,-71,47,7,33,130,127,130,115,125,111,93,99,115,108,50,117,146,132,122,119,146,135,129,122,139,-17,13,-19,-2,-7,6,-35,-42,-30,-7,-31,1,1,4,5,11,10,10,10,8,10,8,14,10,-18,23,-95,11,7,-80,-49,44,30,15,11,-14,28,-84,21,17,-70,-41,54,38,-2,-1,-2,-1,-1,-2,0,-1,0,0,0,190,190,190,190,190,190,190,190,190,190,190,190,11.652399946,11.389623784,11.663900229,10.349172066,11.283115945,10.016242555,8.4418826306,9.062199643,10.538373425,9.8724804607,10.487159952,13.093583247,11.843344848,10.97912167,10.74152638,13.174517235,12.254345754,11.808320747,11.179839633,12.706248,1.1652399946,-1.703959464,-0.179444619,-0.629949604,0.5415895654,-3.15827468,-3.812463123,-2.746121104,-0.641466208,-2.83376754,0.0896338457,0.3587283081,0.4486115473,0.9899208063,0.9026492756,0.9023641942,0.9077293151,0.7322989611,0.9163802978,0.7312948489,0.8963384574,-1.614277387,2.0636131174,-8.549316055,0.9929142032,0.6316549359,-7.261834521,-4.485331136,4.0320733104,2.7423556835,0.9859723031,-1.255549079,2.5122246647,-7.559395248,1.8955634788,1.5340191301,-6.354105206,-3.753032175,4.9484536082,3.4736505325 +050,3,5,51,059,Virginia,Fairfax County,1081726,1081681,1086165,1103571,1120654,1132186,1136794,1141040,1144957,1149346,1149688,1152359,1150847,4484,17406,17083,11532,4608,4246,3917,4389,342,2671,-1512,3846,15352,15211,15244,15169,15385,15225,14423,14534,13883,13523,1051,4647,4678,4900,4788,5043,4919,5090,5126,5351,6215,2795,10705,10533,10344,10381,10342,10306,9333,9408,8532,7308,1465,7496,10770,7565,10802,11849,11110,10401,5323,8234,6371,309,-777,-4144,-6341,-16913,-18162,-17592,-15411,-14444,-14107,-15196,1774,6719,6626,1224,-6111,-6313,-6482,-5010,-9121,-5873,-8825,-85,-18,-76,-36,338,217,93,66,55,12,5,9290,9290,9624,9835,10110,10460,10514,10409,10389,10610,10441,10443,14.021781621,13.677573087,13.533140392,13.370765719,13.50844706,13.320227454,12.572881612,12.643571169,12.061439232,11.742762046,4.2443472638,4.2064089739,4.3500648071,4.2203985932,4.4278907067,4.3035926994,4.4370774043,4.4592641953,4.648905952,5.3968251212,9.7774343574,9.4711641133,9.1830755846,9.1503671253,9.0805563531,9.016634755,8.1358042072,8.1843069741,7.4125332802,6.3459369244,6.8464874304,9.6842720498,6.7159674011,9.5214589816,10.403743205,9.7200477516,9.0668059101,4.6306405212,7.1536332664,5.5322884709,-0.709674591,-3.726241725,-5.629338968,-14.90802034,-15.94672834,-15.39109631,-13.43414536,-12.56527742,-12.25604864,-13.19551964,6.1368128395,5.9580303252,1.0866284334,-5.386561362,-5.542985134,-5.671048562,-4.367339449,-7.934636895,-5.102415372,-7.663231166 +050,3,5,51,061,Virginia,Fauquier County,65203,65222,65433,66032,66567,67150,68135,68449,68831,69555,70722,71297,71361,211,599,535,583,985,314,382,724,1167,575,64,205,747,773,708,784,747,781,758,755,754,767,90,527,480,499,551,537,542,553,602,554,650,115,220,293,209,233,210,239,205,153,200,117,4,14,33,31,39,58,46,38,25,19,21,95,366,220,349,712,52,102,486,994,359,-77,99,380,253,380,751,110,148,524,1019,378,-56,-3,-1,-11,-6,1,-6,-5,-5,-5,-3,3,389,389,389,389,389,389,389,389,389,389,389,389,11.364241433,11.659213116,10.589528631,11.590346306,10.938323669,11.378205128,10.954865377,10.76441612,10.618297552,10.752989668,8.0173430191,7.2398736039,7.4635237105,8.1457663451,7.8632929186,7.8962703963,7.992137933,8.583017886,7.8017730022,9.1127031081,3.346898414,4.4193395124,3.1260049208,3.4445799608,3.0750307503,3.4819347319,2.9627274435,2.1813982335,2.8165245495,1.6402865595,0.2129844445,0.4977413103,0.4636658017,0.5765605943,0.8492942072,0.6701631702,0.5491885017,0.3564376199,0.2675698322,0.2944104081,5.568021907,3.3182754018,5.219979509,10.525926747,0.7614361858,1.486013986,7.0238318905,14.171959765,5.0556615664,-1.07950483,5.7810063515,3.816016712,5.6836453106,11.102487342,1.610730393,2.1561771562,7.5730203922,14.528397385,5.3232313986,-0.785094422 +050,3,5,51,063,Virginia,Floyd County,15279,15293,15367,15404,15438,15493,15538,15565,15685,15783,15788,15796,15777,74,37,34,55,45,27,120,98,5,8,-19,55,161,143,153,157,140,132,147,155,148,139,16,150,143,145,178,179,148,171,171,156,175,39,11,0,8,-21,-39,-16,-24,-16,-8,-36,1,3,6,-3,1,-1,0,-2,-3,-2,-1,34,23,30,52,67,67,137,125,24,19,18,35,26,36,49,68,66,137,123,21,17,17,0,0,-2,-2,-2,0,-1,-1,0,-1,0,85,85,85,85,85,85,85,85,85,85,85,85,10.464398297,9.2730691914,9.8929876176,10.118913345,9.0023470405,8.448,9.3428244566,9.8191378164,9.3718338399,8.8049916068,9.7494394072,9.2730691914,9.3757072193,11.472398569,11.510143716,9.472,10.868183552,10.832726236,9.8784194529,11.085421088,0.7149588899,0,0.5172803983,-1.353485224,-2.507796676,-1.024,-1.525359095,-1.01358842,-0.506585613,-2.280429481,0.1949887881,0.3890798262,-0.193980149,0.0644516774,-0.064302479,0,-0.127113258,-0.190047829,-0.126646403,-0.063345263,1.4949140424,1.9453991311,3.362322589,4.3182623828,4.3082660837,8.768,7.9445786196,1.5203826296,1.2031408308,1.1402147404,1.6899028306,2.3344789573,3.1683424396,4.3827140601,4.2439636048,8.768,7.8174653616,1.3303348009,1.0764944276,1.0768694771 +050,3,5,51,065,Virginia,Fluvanna County,25691,25743,25792,25959,25889,25833,25980,26144,26227,26517,26931,27266,27422,49,167,-70,-56,147,164,83,290,414,335,156,69,263,258,268,260,249,277,258,303,244,255,54,194,191,214,196,201,235,230,233,235,254,15,69,67,54,64,48,42,28,70,9,1,1,7,2,-1,-6,14,32,26,10,20,14,35,91,-137,-106,93,105,12,235,333,307,140,36,98,-135,-107,87,119,44,261,343,327,154,-2,0,-2,-3,-4,-3,-3,1,1,-1,1,1272,1272,1263,1287,1293,1292,1293,1168,1236,1251,1250,1251,10.164054801,9.9521678753,10.363095008,10.036091328,9.5541401274,10.578373527,9.7831032914,11.338123035,9.0041884237,9.3256290228,7.497439663,7.3676901713,8.2750087004,7.5656688476,7.7123781751,8.9744324149,8.7213711512,8.7187546774,8.6720667196,9.2890579286,2.6666151379,2.5844777041,2.0880863076,2.4704224808,1.8417619523,1.6039411124,1.0617321401,2.619368358,0.3321217042,0.0365710942,0.2705261734,0.0771485882,-0.038668265,-0.231602108,0.5371805694,1.2220503714,0.9858941301,0.3741954797,0.7380482315,0.5119953189,3.5168402543,-5.28467829,-4.098836085,3.5898326675,4.0288542706,0.4582688893,8.9109661762,12.460709475,11.329040353,5.119953189,3.7873664277,-5.207529702,-4.13750435,3.3582305599,4.56603484,1.6803192607,9.8968603064,12.834904954,12.067088584,5.6319485079 +050,3,5,51,067,Virginia,Franklin County,56159,56124,56174,56339,56293,56272,56265,56234,56167,56341,56297,56185,56167,50,165,-46,-21,-7,-31,-67,174,-44,-112,-18,133,487,515,530,505,506,540,518,469,523,493,154,528,551,555,597,619,586,601,612,651,719,-21,-41,-36,-25,-92,-113,-46,-83,-143,-128,-226,4,-6,-7,-6,-7,-9,-5,-2,-8,-4,-6,69,214,10,19,109,98,-13,264,109,21,214,73,208,3,13,102,89,-18,262,101,17,208,-2,-2,-13,-9,-17,-7,-3,-5,-2,-1,0,1472,1472,1519,1555,1553,1499,1442,1357,1302,1158,1159,1161,8.6567774391,9.1448256268,9.4167814152,8.9748260572,8.9956355168,9.6084554408,9.2082340811,8.3275626343,9.2992656603,8.7759897465,9.3855821105,9.7840755735,9.8609692178,10.609843874,11.004542263,10.426953497,10.683684716,10.866670218,11.575185363,12.799060097,-0.728804671,-0.639249947,-0.444187803,-1.635017816,-2.008906746,-0.818498056,-1.475450635,-2.539107584,-2.275919703,-4.02307035,-0.106654342,-0.124298601,-0.106605073,-0.12440353,-0.160001422,-0.08896718,-0.035553027,-0.142047977,-0.071122491,-0.106807177,3.8040048705,0.1775694296,0.33758273,1.9371406737,1.7422377088,-0.231314668,4.6929996089,1.9354036826,0.3733930762,3.8094559954,3.6973505284,0.0532708289,0.2309776574,1.8127371442,1.5822362865,-0.320281848,4.6574465816,1.7933557059,0.3022705855,3.702648818 +050,3,5,51,069,Virginia,Frederick County,78305,78266,78545,79519,80247,81494,82735,83525,84722,86568,88378,89483,91119,279,974,728,1247,1241,790,1197,1846,1810,1105,1636,221,959,906,960,964,920,1012,970,961,981,958,104,557,562,657,649,689,709,670,716,804,828,117,402,344,303,315,231,303,300,245,177,130,0,21,37,49,93,115,144,153,128,65,70,158,550,361,893,827,447,752,1395,1439,865,1441,158,571,398,942,920,562,896,1548,1567,930,1511,4,1,-14,2,6,-3,-2,-2,-2,-2,-5,967,967,967,1016,1147,1144,1237,1217,1173,1174,1174,1176,12.134325337,11.341587071,11.870830525,11.739704924,11.067003489,12.029932183,11.325821706,10.986247185,11.031086073,10.608963356,7.0477781152,7.0352891103,8.1240996408,7.9035980247,8.2882232648,8.428084899,7.8229902505,8.1853829182,9.0407677906,9.1693336729,5.0865472214,4.3062979608,3.7467308846,3.8361068995,2.7787802237,3.6018472841,3.5028314554,2.8008642667,1.9903182823,1.4396296829,0.2657151534,0.4631773969,0.6059069747,1.1325648941,1.3833754361,1.7117690063,1.7864440423,1.4633086781,0.7309078438,0.7751852139,6.9592063974,4.5191091972,11.042345478,10.071302876,5.3771201732,8.9392381439,16.288166268,16.45079053,9.7266966901,15.957741332,7.2249215508,4.9822865941,11.648252453,11.20386777,6.7604956093,10.65100715,18.07461031,17.914099208,10.457604534,16.732926546 +050,3,5,51,071,Virginia,Giles County,17286,17288,17317,17152,17024,16992,16853,16768,16855,16759,16829,16693,16663,29,-165,-128,-32,-139,-85,87,-96,70,-136,-30,61,181,168,188,171,166,199,152,169,146,151,33,210,211,234,241,220,239,204,241,236,258,28,-29,-43,-46,-70,-54,-40,-52,-72,-90,-107,1,4,17,3,3,-1,0,0,0,-1,0,2,-139,-103,15,-70,-29,127,-43,141,-43,76,3,-135,-86,18,-67,-30,127,-43,141,-44,76,-2,-1,1,-4,-2,-1,0,-1,1,-2,1,136,136,136,136,136,136,136,136,136,136,136,136,10.502190374,9.8314606742,11.053621825,10.104889939,9.8747806431,11.837135294,9.0438507765,10.06311778,8.7106974524,9.0538433865,12.18486176,12.347846442,13.758231421,14.241394593,13.087058684,14.216458972,12.137799726,14.350363225,14.080305471,15.469480753,-1.682671386,-2.516385768,-2.704609595,-4.136504654,-3.212278041,-2.379323677,-3.09394895,-4.287245445,-5.369608019,-6.415637367,0.2320926049,0.9948501873,0.1763875823,0.1772787709,-0.05948663,0,0,0,-0.059662311,0,-8.065218022,-6.027621723,0.8819379116,-4.136504654,-1.725112281,7.5543526753,-2.558457785,8.3958556627,-2.565479387,4.5569013071,-7.833125417,-5.032771536,1.0583254939,-3.959225883,-1.784598911,7.5543526753,-2.558457785,8.3958556627,-2.625141698,4.5569013071 +050,3,5,51,073,Virginia,Gloucester County,36858,36859,36942,36897,36849,36780,37038,37032,37121,37332,37398,37499,37459,83,-45,-48,-69,258,-6,89,211,66,101,-40,102,362,339,342,391,402,349,368,352,344,339,64,354,346,333,337,370,400,424,439,420,474,38,8,-7,9,54,32,-51,-56,-87,-76,-135,3,18,35,19,23,34,12,5,-1,4,2,47,-71,-74,-95,190,-72,131,261,157,174,93,50,-53,-39,-76,213,-38,143,266,156,178,95,-5,0,-2,-2,-9,0,-3,1,-3,-1,0,368,361,375,419,389,389,373,346,358,293,293,293,9.8051165373,9.1937189814,9.2898178707,10.593622152,10.854597003,9.41297048,9.8854310773,9.4205807574,9.1859487029,9.0450652365,9.588428879,9.3835597863,9.0453489793,9.130564361,9.9905494802,10.788504848,11.389735806,11.748962933,11.215402486,12.647082366,0.2166876583,-0.189840805,0.2444688913,1.4630577908,0.8640475226,-1.375534368,-1.504304729,-2.328382176,-2.029453783,-3.60201713,0.4875472311,0.9492040246,0.5161009928,0.6231542442,0.9180504928,0.3236551454,0.1343129222,-0.026763014,0.106813357,0.0533632167,-1.923102967,-2.006888509,-2.580504964,5.1477959305,-1.944106926,3.5332353377,7.0111345413,4.2017931219,4.6463810299,2.4813895782,-1.435555736,-1.057684485,-2.064403971,5.7709501748,-1.026056433,3.8568904832,7.1454474635,4.1750301084,4.753194387,2.5347527949 +050,3,5,51,075,Virginia,Goochland County,21717,21852,21906,21537,21438,21732,22020,22344,22665,22893,23423,23949,24431,54,-369,-99,294,288,324,321,228,530,526,482,38,174,157,169,173,180,163,173,179,176,184,17,185,175,195,185,197,171,191,222,215,226,21,-11,-18,-26,-12,-17,-8,-18,-43,-39,-42,0,3,10,3,1,4,-1,2,-1,0,-1,33,-365,-91,308,296,333,332,245,572,565,528,33,-362,-81,311,297,337,331,247,571,565,527,0,4,0,9,3,4,-2,-1,2,0,-3,1405,1407,971,901,1000,999,1003,928,876,983,983,983,8.0104965127,7.3065735893,7.8295112347,7.9082099104,8.1146875845,7.2429958453,7.59471443,7.7295103204,7.4305496918,7.6064489458,8.5169072117,8.1442699244,9.0340514246,8.4567562626,8.8810747453,7.5984803039,8.3849159313,9.5863200622,9.0770919531,9.3427035965,-0.506410699,-0.837696335,-1.20454019,-0.548546352,-0.766387161,-0.355484459,-0.790201501,-1.856809742,-1.646542261,-1.736254651,0.1381120088,0.4653868528,0.1389854065,0.045712196,0.1803263908,-0.044435557,0.0878001668,-0.043181622,0,-0.041339396,-16.80362774,-4.235020361,14.269168404,13.53081002,15.012172031,14.752605035,10.755520435,24.699887728,23.853753272,21.827201323,-16.66551573,-3.769633508,14.408153811,13.576522216,15.192498422,14.708169477,10.843320602,24.656706106,23.853753272,21.785861926 +050,3,5,51,077,Virginia,Grayson County,15533,15557,15500,15368,15146,15131,15925,15960,15870,15699,15621,15574,15493,-57,-132,-222,-15,794,35,-90,-171,-78,-47,-81,36,143,139,153,160,122,126,131,118,127,126,66,229,224,216,214,181,208,197,215,181,195,-30,-86,-85,-63,-54,-59,-82,-66,-97,-54,-69,0,-2,-2,-2,-1,4,10,7,3,7,4,-27,-43,-137,53,806,91,-17,-110,16,-1,-15,-27,-45,-139,51,805,95,-7,-103,19,6,-11,0,-1,2,-3,43,-1,-1,-2,0,1,-1,178,178,178,178,178,1030,1096,1105,1104,1068,1069,1066,9.2652585202,9.1105721964,10.10668164,10.303967027,7.6525011761,7.9170593779,8.2992809402,7.5351213282,8.1423305017,8.1115009496,14.837372036,14.68178541,14.268256432,13.781555899,11.353300925,13.069431354,12.480598055,13.729246488,11.604423786,12.553513374,-5.572113516,-5.571213214,-4.161574793,-3.477588872,-3.700799749,-5.152371976,-4.181317115,-6.19412516,-3.462093284,-4.442012425,-0.129584035,-0.13108737,-0.132113485,-0.064399794,0.2509016779,0.6283380459,0.4434730273,0.1915708812,0.4487898702,0.2575079667,-2.786056758,-8.979484827,3.5010073653,51.9062339,5.7080131723,-1.068174678,-6.968861858,1.0217113665,-0.064112839,-0.965654875,-2.915640793,-9.110572196,3.3688938798,51.841834106,5.9589148502,-0.439836632,-6.525388831,1.2132822478,0.3846770316,-0.708146908 +050,3,5,51,079,Virginia,Greene County,18403,18412,18480,18694,18831,18874,19131,19205,19313,19608,19719,19901,20131,68,214,137,43,257,74,108,295,111,182,230,80,206,233,216,216,200,203,228,232,223,214,44,146,131,162,136,176,152,140,169,165,173,36,60,102,54,80,24,51,88,63,58,41,2,19,20,60,52,29,23,28,16,24,19,28,136,19,-68,124,25,35,178,33,100,172,30,155,39,-8,176,54,58,206,49,124,191,2,-1,-4,-3,1,-4,-1,1,-1,0,-2,137,137,137,137,137,137,137,137,137,137,137,137,11.08301501,12.418387742,11.457366397,11.366925405,10.434056761,10.540526507,11.716040184,11.79850993,11.256940939,10.691446843,7.8549523861,6.982011992,8.5930247978,7.1569530325,9.1819699499,7.8924139363,7.1940597621,8.5946042159,8.3291267037,8.6430855316,3.2280626244,5.4363757495,2.8643415993,4.2099723721,1.2520868114,2.6481125707,4.5219804219,3.2039057136,2.9278142352,2.048361311,1.0222198311,1.0659560293,3.182601777,2.7364820418,1.5129382304,1.1942468456,1.4388119524,0.81369034,1.2115093387,0.9492406075,7.3169419487,1.0126582278,-3.606948681,6.5254571767,1.3042570952,1.8173321564,9.1467331261,1.6782363262,5.047955578,8.5931254996,8.3391617797,2.0786142572,-0.424346904,9.2619392185,2.8171953255,3.011579002,10.585545078,2.4919266662,6.2594649167,9.5423661071 +050,3,5,51,081,Virginia,Greensville County,12243,12245,12233,12001,11746,11690,11568,11792,11515,11552,11380,11289,11280,-12,-232,-255,-56,-122,224,-277,37,-172,-91,-9,17,109,103,102,104,96,103,71,76,80,93,7,132,115,121,126,206,173,137,151,108,123,10,-23,-12,-19,-22,-110,-70,-66,-75,-28,-30,1,3,7,4,3,7,2,3,1,3,3,-22,-215,-262,-41,-107,320,-210,98,-97,-66,18,-21,-212,-255,-37,-104,327,-208,101,-96,-63,21,-1,3,12,0,4,7,1,2,-1,0,0,3527,3527,3432,3188,3168,3128,3509,3401,3502,3409,3418,3416,8.99562598,8.6747799722,8.7045570917,8.943159343,8.2191780822,8.8385463595,6.1559804049,6.6282923426,7.0580969606,8.2413930613,10.89378559,9.6854339496,10.325994197,10.834981512,17.636986301,14.845325439,11.878441063,13.169370312,9.5284308968,10.899906952,-1.89815961,-1.010653977,-1.621437105,-1.891822169,-9.417808219,-6.006779079,-5.722460658,-6.54107797,-2.470333936,-2.658513891,0.2475860361,0.5895481535,0.3413551801,0.2579757503,0.5993150685,0.1716222594,0.2601118481,0.0872143729,0.264678636,0.2658513891,-17.74366592,-22.06594517,-3.498890596,-9.201135093,27.397260274,-18.02033724,8.4969870378,-8.459794174,-5.822929993,1.5951083344,-17.49607989,-21.47639702,-3.157535416,-8.943159343,27.996575342,-17.84871498,8.7570988859,-8.372579801,-5.558251356,1.8609597235 +050,3,5,51,083,Virginia,Halifax County,36241,36253,36204,35997,35740,35389,35205,35104,35003,34592,34212,34035,33633,-49,-207,-257,-351,-184,-101,-101,-411,-380,-177,-402,94,340,347,348,369,396,391,375,352,361,351,118,488,427,470,491,468,460,488,487,495,535,-24,-148,-80,-122,-122,-72,-69,-113,-135,-134,-184,0,-1,1,-2,2,3,4,4,-1,2,1,-20,-57,-178,-225,-57,-26,-34,-302,-242,-45,-218,-20,-58,-177,-227,-55,-23,-30,-298,-243,-43,-217,-5,-1,0,-2,-7,-6,-2,0,-2,0,-1,738,729,738,723,757,756,760,753,757,757,757,757,9.4181521032,9.6742266892,9.7850384513,10.454146245,11.264560725,11.154378307,10.776636253,10.231963258,10.579219599,10.374179819,13.517818313,11.904595955,13.215425495,13.91053064,13.312662675,13.122798009,14.023995977,14.156153712,14.506132138,15.812496305,-4.09966621,-2.230369266,-3.430387043,-3.456384395,-2.04810195,-1.968419701,-3.247359724,-3.924190454,-3.926912538,-5.438316486,-0.027700447,0.0278796158,-0.056235853,0.0566620393,0.0853375812,0.114111287,0.1149507867,-0.029068077,0.0586106349,0.0295560679,-1.5789255,-4.962571616,-6.326533481,-1.614868119,-0.739592371,-0.96994594,-8.678784395,-7.03447474,-1.318739285,-6.443222794,-1.606625947,-4.934692,-6.382769335,-1.55820608,-0.65425479,-0.855834653,-8.563833609,-7.063542817,-1.26012865,-6.413666726 +050,3,5,51,085,Virginia,Hanover County,99863,99833,99886,99899,100340,101075,101740,103095,104345,105729,106821,107535,108262,53,13,441,735,665,1355,1250,1384,1092,714,727,236,890,862,920,896,941,963,896,967,974,952,224,759,848,860,856,926,906,936,941,1041,1032,12,131,14,60,40,15,57,-40,26,-67,-80,9,48,48,81,101,112,100,101,44,73,67,36,-166,396,611,542,1228,1097,1330,1030,713,739,45,-118,444,692,643,1340,1197,1431,1074,786,806,-4,0,-17,-17,-18,0,-4,-7,-8,-5,1,1980,1958,1845,2036,1954,1863,1940,2022,2028,1951,1952,1951,8.9095777961,8.6097113949,9.1353672765,8.8356383897,9.1878829302,9.284612418,8.5303274084,9.0990355211,9.0876859057,8.8231069014,7.5981680306,8.4698784952,8.5395824541,8.4411902473,9.0414235848,8.7350559198,8.9111455963,8.854387203,9.7128141969,9.5645444561,1.3114097655,0.1398328997,0.5957848224,0.3944481424,0.1464593453,0.5495564983,-0.380818188,0.244648318,-0.625128291,-0.741437555,0.4805165553,0.4794270846,0.8043095102,0.9959815595,1.0935631118,0.9641342075,0.9615659244,0.4140202305,0.6811099293,0.6209539521,-1.66178642,3.9552734482,6.0670754413,5.3447723295,11.990138404,10.576552256,12.662204747,9.6918372148,6.6524846517,6.8490294119,-1.181269865,4.4347005329,6.8713849515,6.340753889,13.083701516,11.540686464,13.623770671,10.105857445,7.333594581,7.469983364 +050,3,5,51,087,Virginia,Henrico County,306935,306698,307201,310401,315575,318646,321863,324424,326178,328008,329917,332513,333766,503,3200,5174,3071,3217,2561,1754,1830,1909,2596,1253,998,3932,4076,4029,4090,4157,4073,3926,4155,3978,3897,626,2473,2405,2544,2650,2821,2778,2873,2875,2906,3067,372,1459,1671,1485,1440,1336,1295,1053,1280,1072,830,264,1334,1725,1246,1666,1913,2092,1984,1074,1588,1237,-107,419,1793,393,171,-657,-1632,-1198,-437,-72,-828,157,1753,3518,1639,1837,1256,460,786,637,1516,409,-26,-12,-15,-53,-60,-31,-1,-9,-8,8,14,2494,2514,2494,2604,2499,2500,2617,2612,2805,2751,2750,2750,12.733119388,13.022863496,12.705350343,12.77109299,12.864253807,12.520711587,12.002702595,12.630618992,12.010325619,11.697802272,8.0083937552,7.6840006646,8.0224401273,8.2746690523,8.7298676904,8.5397831547,8.7834346807,8.7395979785,8.7737572272,9.2063534946,4.7247256324,5.3388628318,4.6829102158,4.4964239378,4.1343861164,3.9809284324,3.2192679146,3.891021013,3.2365683921,2.4914487775,4.3199341971,5.5113934081,3.9292297165,5.2021126947,5.9199705394,6.4309670121,6.0655532219,3.2648098187,4.7944688495,3.7131592021,1.356860891,5.7286541337,1.2393156329,0.5339503426,-2.033152454,-5.016892048,-3.662566915,-1.328418893,-0.217381459,-2.485445286,5.6767950881,11.240047542,5.1685453493,5.7360630374,3.8868180855,1.4140749644,2.4029863066,1.936390926,4.5770873904,1.2277139156 +050,3,5,51,089,Virginia,Henry County,54151,54144,54102,53530,53098,52738,52235,51944,51654,51370,51101,50724,50309,-42,-572,-432,-360,-503,-291,-290,-284,-269,-377,-415,132,561,514,520,482,452,479,459,466,452,428,137,723,658,725,712,674,661,663,723,700,782,-5,-162,-144,-205,-230,-222,-182,-204,-257,-248,-354,14,40,33,-1,9,12,15,16,5,9,8,-45,-452,-320,-147,-280,-75,-119,-93,-14,-137,-70,-31,-412,-287,-148,-271,-63,-104,-77,-9,-128,-62,-6,2,-1,-7,-2,-6,-4,-3,-3,-1,1,561,561,561,562,567,565,592,561,561,562,562,562,10.424409098,9.6409948606,9.8265240561,9.1833138045,8.6773725991,9.2472827661,8.9105451157,9.0952562188,8.8779769212,8.4724792889,13.43466627,12.341973966,13.700442194,13.565393006,12.939267991,12.760864109,12.870787389,14.111309541,13.749079303,15.480090663,-3.010257173,-2.700979105,-3.873918137,-4.382079201,-4.261895392,-3.513581343,-3.960242274,-5.016053322,-4.871102382,-7.007611375,0.7432733759,0.6189743782,-0.018897162,0.1714726644,0.2303727239,0.2895808799,0.3106072371,0.097588586,0.1767738767,0.1583640989,-8.398989148,-6.002175789,-2.777882762,-5.334705115,-1.439829524,-2.297341648,-1.805404566,-0.273248041,-2.690891235,-1.385685865,-7.655715772,-5.383201411,-2.796779924,-5.16323245,-1.2094568,-2.007760768,-1.494797329,-0.175659455,-2.514117358,-1.227321766 +050,3,5,51,091,Virginia,Highland County,2321,2319,2297,2260,2234,2205,2238,2196,2213,2215,2206,2176,2200,-22,-37,-26,-29,33,-42,17,2,-9,-30,24,0,21,18,12,19,10,22,18,13,18,14,14,23,28,23,36,29,21,24,22,41,31,-14,-2,-10,-11,-17,-19,1,-6,-9,-23,-17,0,0,0,0,0,0,0,0,0,0,0,-8,-35,-14,-18,49,-22,16,9,-1,-7,40,-8,-35,-14,-18,49,-22,16,9,-1,-7,40,0,0,-2,0,1,-1,0,-1,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,9.2165898618,8.0106809079,5.4066231133,8.5527796534,4.5105999098,9.979587208,8.1300813008,5.8810223931,8.2154267458,6.3985374771,10.094360325,12.46105919,10.362694301,16.205266712,13.080739738,9.5259696076,10.840108401,9.9524994345,18.712916476,14.168190128,-0.877770463,-4.450378282,-4.956071187,-7.652487058,-8.570139829,0.4536176004,-2.7100271,-4.071477041,-10.49748973,-7.769652651,0,0,0,0,0,0,0,0,0,0,-15.3609831,-6.230529595,-8.10993467,22.05716858,-9.923319802,7.2578816058,4.0650406504,-0.452386338,-3.194888179,18.281535649,-15.3609831,-6.230529595,-8.10993467,22.05716858,-9.923319802,7.2578816058,4.0650406504,-0.452386338,-3.194888179,18.281535649 +050,3,5,51,093,Virginia,Isle of Wight County,35270,35279,35319,35301,35352,35542,35887,36185,36450,36758,37203,37400,37725,40,-18,51,190,345,298,265,308,445,197,325,95,336,330,289,362,346,388,374,376,353,349,73,323,329,385,341,327,309,388,368,377,428,22,13,1,-96,21,19,79,-14,8,-24,-79,4,5,47,37,37,37,109,105,76,88,73,18,-34,7,246,294,245,80,221,360,133,334,22,-29,54,283,331,282,189,326,436,221,407,-4,-2,-4,3,-7,-3,-3,-4,1,0,-3,310,310,310,310,310,310,310,310,310,310,310,310,9.5157179269,9.3414292387,8.1530171806,10.135939184,9.6015096015,10.68355476,10.217462572,10.16752072,9.4634264038,9.2911813644,9.147550269,9.3131218773,10.861285863,9.5479427123,9.0742590743,8.5082948992,10.599934433,9.9511904923,10.106832165,11.394342762,0.3681676579,0.0283073613,-2.708268683,0.587996472,0.5272505273,2.1752598609,-0.382471861,0.2163302281,-0.643405761,-2.103161398,0.1416029453,1.3304459825,1.0438118882,1.035993784,1.0267510268,3.0013079094,2.8685389575,2.0551371669,2.3591544576,1.9434276206,-0.962900028,0.1981515293,6.9399384997,8.2319506083,6.7987567988,2.2027947959,6.0375915201,9.7348602642,3.5655402598,8.8918469218,-0.821297083,1.5285975118,7.9837503879,9.2679443923,7.8255078255,5.2041027053,8.9061304775,11.789997431,5.9246947174,10.835274542 +050,3,5,51,095,Virginia,James City County,67009,67400,67681,68339,69460,70674,72145,72920,74075,75429,76206,76838,77612,281,658,1121,1214,1471,775,1155,1354,777,632,774,159,657,672,613,682,677,646,641,669,651,671,184,591,601,641,655,748,767,775,857,773,770,-25,66,71,-28,27,-71,-121,-134,-188,-122,-99,33,91,158,91,130,170,205,168,105,113,102,262,503,881,1133,1293,678,1073,1321,864,647,776,295,594,1039,1224,1423,848,1278,1489,969,760,878,11,-2,11,18,21,-2,-2,-1,-4,-6,-5,1100,1099,1043,1066,1061,1034,1088,1074,1086,1140,1142,1140,9.660344067,9.7533363813,8.7487690354,9.5505499968,9.333746941,8.7894146059,8.5750214041,8.8238203581,8.5073573613,8.6888960829,8.6898985443,8.7228499481,9.1483865443,9.1724490439,10.312618481,10.435729106,10.367615582,11.303458964,10.101670108,9.9708643574,0.9704455227,1.0304864331,-0.399617509,0.378100953,-0.97887154,-1.6463145,-1.792594178,-2.479638606,-1.594312747,-1.281968275,1.3380385237,2.2931951611,1.2987569041,1.8204860698,2.3437769276,2.7892105174,2.2474315068,1.3849045405,1.4766995113,1.320815798,7.3959711807,12.786740107,16.170237059,18.106834525,9.3475338641,14.599136025,17.671767979,11.395785933,8.4550848122,10.048559404,8.7340097045,15.079935268,17.468993963,19.927320595,11.691310792,17.388346542,19.919199486,12.780690474,9.9317843235,11.369375202 +050,3,5,51,097,Virginia,King and Queen County,6945,6940,6976,6986,7008,7029,7084,7089,7059,7010,7033,7011,6942,36,10,22,21,55,5,-30,-49,23,-22,-69,21,61,63,52,67,70,63,68,69,57,60,7,83,72,74,73,79,75,85,105,86,105,14,-22,-9,-22,-6,-9,-12,-17,-36,-29,-45,1,4,0,4,-2,1,4,7,1,5,3,21,28,32,38,63,14,-22,-37,58,2,-26,22,32,32,42,61,15,-18,-30,59,7,-23,0,0,-1,1,0,-1,0,-2,0,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,8.7380031514,9.0038587966,7.408990525,9.4947920357,9.8779369223,8.9058524173,9.6666429739,9.8269600513,8.1173454856,8.6003010105,11.889414124,10.290124339,10.543563439,10.34507192,11.147957384,10.602205259,12.083303717,14.954069643,12.247223013,15.050526768,-3.151410973,-1.286265542,-3.134572914,-0.850279884,-1.270020461,-1.696352841,-2.416660743,-5.127109592,-4.129877528,-6.450225758,0.5729838132,0,0.5699223481,-0.283426628,0.1411133846,0.5654509471,0.9950956003,0.1424197109,0.7120478496,0.4300150505,4.0108866925,4.5733885951,5.4142623068,8.9279387798,1.9755873845,-3.109980209,-5.25979103,8.2603432315,0.2848191398,-3.726797105,4.5838705057,4.5733885951,5.9841846548,8.6445121519,2.1167007691,-2.544529262,-4.26469543,8.4027629424,0.9968669895,-3.296782054 +050,3,5,51,099,Virginia,King George County,23584,23578,23697,24277,24615,24909,25284,25442,25982,26379,26673,26981,27381,119,580,338,294,375,158,540,397,294,308,400,70,335,310,305,301,305,313,285,282,322,306,15,148,147,185,164,164,162,185,191,180,200,55,187,163,120,137,141,151,100,91,142,106,26,6,48,19,25,51,29,39,42,10,20,37,385,128,154,211,-32,359,259,159,156,274,63,391,176,173,236,19,388,298,201,166,294,1,2,-1,1,2,-2,1,-1,2,0,0,301,301,301,301,301,301,301,301,301,301,301,301,13.965898195,12.681011208,12.317260318,11.993704301,12.025391318,12.173304294,10.885964745,10.631078941,12.002832967,11.257863949,6.1700087547,6.013253702,7.4711251111,6.5347757655,6.466112053,6.3005600498,7.0663279922,7.2004825454,6.7096581802,7.3580810125,7.7958894401,6.6677575063,4.8461352072,5.4589285359,5.5592792651,5.8727442439,3.8196367525,3.430596396,5.2931747866,3.8997829366,0.2501354901,1.9635114129,0.7673047411,0.9961548423,2.0108031384,1.1278780336,1.4896583335,1.5833521828,0.3727587878,0.7358081012,16.050360612,5.2360304344,6.2192068492,8.4075468691,-1.261680401,13.962352209,9.8928591891,5.9941189776,5.8150370895,10.080570987,16.300496102,7.1995418473,6.9865115903,9.4037017114,0.7491227378,15.090230243,11.382517523,7.5774711604,6.1877958773,10.816379088 +050,3,5,51,101,Virginia,King William County,15935,15927,15999,16013,15977,16096,16153,16287,16416,16706,16962,17198,17641,72,14,-36,119,57,134,129,290,256,236,443,51,197,191,192,173,198,200,205,207,205,206,19,131,147,149,130,156,161,150,139,152,164,32,66,44,43,43,42,39,55,68,53,42,1,-2,0,6,12,8,12,11,5,10,7,38,-51,-79,72,7,84,78,223,182,172,397,39,-53,-79,78,19,92,90,234,187,182,404,1,1,-1,-2,-5,0,0,1,1,1,-3,72,72,72,72,72,72,72,72,72,72,72,72,12.307884543,11.941231635,11.972687307,10.729014853,12.207151665,12.231293765,12.37847956,12.296542711,12.00234192,11.825827377,8.1844308384,9.1903719912,9.2913042123,8.0622654966,9.617755857,9.8461914809,9.0574240686,8.2570987288,8.8992974239,9.4147363587,4.1234537049,2.7508596436,2.6813830948,2.6667493566,2.5893958076,2.3851022842,3.3210554918,4.0394439824,3.1030444965,2.4110910187,-0.124953143,0,0.3741464783,0.7442091228,0.4932182491,0.7338776259,0.6642110984,0.2970179399,0.5854800937,0.4018485031,-3.186305136,-4.939043451,4.4897577402,0.4341219883,5.1787916153,4.7702045684,13.465370449,10.811453012,10.070257611,22.790550819,-3.311258278,-4.939043451,4.8639042185,1.178331111,5.6720098644,5.5040821943,14.129581547,11.108470952,10.655737705,23.192399323 +050,3,5,51,103,Virginia,Lancaster County,11391,11390,11362,11276,11125,10960,10863,10828,10776,10724,10692,10619,10618,-28,-86,-151,-165,-97,-35,-52,-52,-32,-73,-1,25,87,91,65,74,98,99,71,83,80,84,68,206,207,203,174,192,205,236,230,200,219,-43,-119,-116,-138,-100,-94,-106,-165,-147,-120,-135,1,5,11,6,10,21,21,19,16,15,13,17,30,-44,-31,-6,41,33,96,99,33,122,18,35,-33,-25,4,62,54,115,115,48,135,-3,-2,-2,-2,-1,-3,0,-2,0,-1,-1,183,183,183,184,185,185,183,183,185,183,183,183,7.6861913597,8.124637293,5.8863482001,6.781835678,9.0360057167,9.1649694501,6.6046511628,7.7512140456,7.5078597907,7.9107218534,18.199487587,18.481317798,18.383518225,15.946478486,17.703194873,18.977967043,21.953488372,21.479267837,18.769649477,20.624381975,-10.51329623,-10.35668051,-12.49717002,-9.164642808,-8.667189157,-9.812997593,-15.34883721,-13.72805379,-11.26178969,-12.71366012,0.4417351356,0.9820990134,0.5433552185,0.9164642808,1.9362869393,1.9440844288,1.7674418605,1.4942099365,1.4077237108,1.2242783821,2.6504108137,-3.928396054,-2.807335295,-0.549878568,3.7803697386,3.0549898167,8.9302325581,9.2454239821,3.0969921637,11.489381739,3.0921459493,-2.94629704,-2.263980077,0.3665857123,5.7166566779,4.9990742455,10.697674419,10.739633919,4.5047158744,12.713660121 +050,3,5,51,105,Virginia,Lee County,25587,25591,25606,25546,25433,25094,24744,24624,24198,23934,23703,23540,23238,15,-60,-113,-339,-350,-120,-426,-264,-231,-163,-302,60,256,259,249,216,217,223,210,192,224,200,53,263,297,286,307,264,239,284,306,277,296,7,-7,-38,-37,-91,-47,-16,-74,-114,-53,-96,1,2,1,1,-4,-4,-2,-4,-2,-2,0,10,-53,-73,-310,-258,-66,-410,-187,-116,-108,-206,11,-51,-72,-309,-262,-70,-412,-191,-118,-110,-206,-3,-2,-3,7,3,-3,2,1,1,0,0,1706,1706,1706,1706,1716,1750,1774,1633,1495,1461,1461,1457,10.009383797,10.161046706,9.8561165318,8.6680845941,8.7911197537,9.1352259227,8.7260034904,8.0609610177,9.4828863535,8.5510282611,10.283077886,11.651856647,11.320680032,12.31991653,10.695187166,9.7906681414,11.800880911,12.847156622,11.726605,12.655521826,-0.273694088,-1.490809941,-1.464563501,-3.651831935,-1.904067412,-0.655442219,-3.07487742,-4.786195604,-2.243718646,-4.104493565,0.0781983109,0.0392318406,0.0395827973,-0.160520085,-0.16204829,-0.081930277,-0.16620959,-0.083968344,-0.084668628,0,-2.072255239,-2.863924361,-12.27066717,-10.35354549,-2.673796791,-16.79570685,-7.770298346,-4.870163948,-4.57210592,-8.807559109,-1.994056928,-2.82469252,-12.23108437,-10.51406557,-2.835845082,-16.87763713,-7.936507937,-4.954132292,-4.656774549,-8.807559109 +050,3,5,51,107,Virginia,Loudoun County,312311,312342,315486,326357,337902,350001,362330,374176,385750,397192,405964,414872,422784,3144,10871,11545,12099,12329,11846,11574,11442,8772,8908,7912,1293,5015,5004,4909,5112,5188,5390,5194,5175,5110,5075,195,1020,1066,1118,1150,1202,1310,1438,1516,1556,1749,1098,3995,3938,3791,3962,3986,4080,3756,3659,3554,3326,383,1760,2514,1773,2365,2560,2450,2298,1186,1738,1361,1539,5084,4963,6390,5852,5254,5026,5377,3923,3616,3207,1922,6844,7477,8163,8217,7814,7476,7675,5109,5354,4568,124,32,130,145,150,46,18,11,4,0,18,1172,1175,1175,1340,1340,1634,1654,1660,1646,1696,1695,1693,15.626874485,15.066412348,14.272361074,14.352878086,14.08814049,14.185591755,13.267904902,12.886662118,12.450720972,12.117145941,3.1783473529,3.2095914395,3.2504582768,3.2288360327,3.2640603064,3.4477041186,3.6733244608,3.7751072021,3.7912567188,4.1759385714,12.448527132,11.856820909,11.021902797,11.124042053,10.824080184,10.737887636,9.5945804415,9.1115549159,8.6594642535,7.9412073691,5.4842071971,7.5693366593,5.1547965338,6.6401714933,6.9517424162,6.4479962523,5.8701666279,2.953349038,4.2347070548,3.2495439655,15.841880335,14.942966524,18.578200706,16.430563881,14.2673651,13.22760374,13.73537248,9.7689614471,8.8105297526,7.6570811885,21.326087532,22.512303183,23.732997239,23.070735374,21.219107516,19.675599993,19.605539108,12.722310485,13.045236807,10.906625154 +050,3,5,51,109,Virginia,Louisa County,33153,33028,33169,33325,33357,33850,34173,34475,35202,35803,36656,37477,38132,141,156,32,493,323,302,727,601,853,821,655,102,367,382,382,373,354,392,369,362,379,376,49,278,301,277,298,303,297,356,368,389,424,53,89,81,105,75,51,95,13,-6,-10,-48,1,2,-2,7,7,14,28,22,6,18,12,83,64,-41,376,244,237,602,561,848,815,695,84,66,-43,383,251,251,630,583,854,833,707,4,1,-6,5,-3,0,2,5,5,-2,-4,211,211,211,211,211,211,211,211,211,211,211,211,11.038589948,11.457364806,11.367863467,10.96687885,10.313483277,11.251919572,10.393634251,9.9918574642,10.224866119,9.9459059107,8.3616566908,9.0279235776,8.2431889535,8.7617423519,8.8276424659,8.5250513082,10.027462855,10.157468361,10.494651505,11.215596027,2.6769332571,2.4294412285,3.1246745131,2.2051364979,1.4858408111,2.7268682636,0.3661713964,-0.165610897,-0.269785386,-1.269690116,0.0601558035,-0.059986203,0.2083116342,0.2058127398,0.4078778697,0.8037085408,0.6196746708,0.1656108972,0.4856136943,0.3174225291,1.924985713,-1.229717165,11.189310637,7.1740440733,6.9047896516,17.279733628,15.801704105,23.406340137,21.987508937,18.384054808,1.9851415165,-1.289703368,11.397622271,7.3798568131,7.3126675213,18.083442169,16.421378776,23.571951034,22.473122631,18.701477337 +050,3,5,51,111,Virginia,Lunenburg County,12914,12916,12909,12907,12639,12534,12480,12348,12340,12353,12257,12251,12267,-7,-2,-268,-105,-54,-132,-8,13,-96,-6,16,26,135,124,114,106,132,142,118,129,108,103,52,145,127,148,154,130,153,161,155,165,177,-26,-10,-3,-34,-48,2,-11,-43,-26,-57,-74,3,3,11,5,5,18,38,42,13,33,23,16,7,-288,-76,-9,-153,-35,15,-82,18,67,19,10,-277,-71,-4,-135,3,57,-69,51,90,0,-2,12,0,-2,1,0,-1,-1,0,0,1203,1203,1203,1081,1069,974,949,972,993,1000,1002,1002,10.458630307,9.7079777656,9.0573233226,8.4752538578,10.633156114,11.503564485,9.5573644353,10.483543275,8.8134486698,8.4019903744,11.233343663,9.9428481954,11.758630278,12.313104661,10.472047688,12.394685677,13.040132831,12.596505486,13.464991023,14.438371808,-0.774713356,-0.23487043,-2.701306956,-3.837850804,0.161108426,-0.891121192,-3.482768396,-2.11296221,-4.651542354,-6.036381434,0.2324140068,0.861191576,0.3972510229,0.3997761254,1.4499758337,3.0784186649,3.401773782,1.0564811052,2.6929982047,1.8761726079,0.5422993492,-22.54756126,-6.038215548,-0.719597026,-12.32479459,-2.835385612,1.2149192079,-6.663957741,1.4689081116,5.4653723795,0.7747133561,-21.68636969,-5.640964525,-0.3198209,-10.87481875,0.2430330525,4.6166929899,-5.607476636,4.1619063163,7.3415449874 +050,3,5,51,113,Virginia,Madison County,13308,13306,13299,13142,13135,13093,13034,13054,13097,13218,13198,13213,13312,-7,-157,-7,-42,-59,20,43,121,-20,15,99,30,118,116,121,114,116,153,121,132,154,135,15,137,139,149,148,141,166,148,157,134,149,15,-19,-23,-28,-34,-25,-13,-27,-25,20,-14,1,1,1,7,14,24,18,15,7,14,8,-22,-140,16,-18,-38,22,40,131,-1,-20,106,-21,-139,17,-11,-24,46,58,146,6,-6,114,-1,1,-1,-3,-1,-1,-2,2,-1,1,-1,193,193,193,193,193,193,193,193,193,193,193,193,8.9255323172,8.8290139666,9.2267805399,8.7266046618,8.8929776142,11.701273374,9.1962758883,9.9939430648,11.66180758,10.179076343,10.362694301,10.579594322,11.361903309,11.329276228,10.809567617,12.695499216,11.24833745,11.886735312,10.147287115,11.23468426,-1.437161983,-1.750580355,-2.13512277,-2.602671566,-1.916590003,-0.994225842,-2.052061562,-1.892792247,1.514520465,-1.055607917,0.0756401044,0.0761121894,0.5337806924,1.0716882918,1.8399264029,1.3766203969,1.140034201,0.5299818292,1.0601643255,0.603204524,-10.58961461,1.2177950299,-1.372578923,-2.908868221,1.6865992027,3.0591564376,9.956298689,-0.07571169,-1.514520465,7.9924599434,-10.51397451,1.2939072192,-0.838798231,-1.837179929,3.5265256056,4.4357768345,11.09633289,0.4542701393,-0.454356139,8.5956644675 +050,3,5,51,115,Virginia,Mathews County,8978,8976,8974,8944,8911,8899,8813,8833,8781,8704,8766,8782,8766,-2,-30,-33,-12,-86,20,-52,-77,62,16,-16,13,48,69,61,51,57,73,52,64,55,60,18,109,114,126,92,123,136,145,129,115,132,-5,-61,-45,-65,-41,-66,-63,-93,-65,-60,-72,1,5,10,8,9,1,1,0,0,0,0,4,28,3,45,-53,85,10,17,127,76,58,5,33,13,53,-44,86,11,17,127,76,58,-2,-2,-1,0,-1,0,0,-1,0,0,-2,94,94,86,86,86,86,86,94,86,86,86,86,5.3577408193,7.7289274713,6.8500842223,5.7588075881,6.4603876233,8.2888611332,5.9479553903,7.3268460218,6.2685206291,6.8383861409,12.166536444,12.769532344,14.149354295,10.388437218,13.94083645,15.442261837,16.585644838,14.768174013,13.10690677,15.04444951,-6.808795625,-5.040604873,-7.299270073,-4.62962963,-7.480448827,-7.153400704,-10.63768945,-7.441327991,-6.838386141,-8.206063369,0.558098002,1.1201344161,0.8983717013,1.0162601626,0.1133401337,0.1135460429,0,0,0,0,3.1253488113,0.3360403248,5.0533408198,-5.98464318,9.633911368,1.1354604292,1.9445238776,14.539210074,8.6619557784,6.6104399362,3.6834468133,1.456174741,5.9517125211,-4.968383017,9.7472515018,1.2490064721,1.9445238776,14.539210074,8.6619557784,6.6104399362 +050,3,5,51,117,Virginia,Mecklenburg County,32727,32722,32716,32567,31698,31249,31117,30934,30815,30705,30707,30723,30679,-6,-149,-869,-449,-132,-183,-119,-110,2,16,-44,71,285,315,270,301,282,290,306,323,303,314,63,450,445,452,405,464,416,508,506,452,497,8,-165,-130,-182,-104,-182,-126,-202,-183,-149,-183,4,21,29,15,8,3,1,10,2,7,6,-11,-5,-806,-286,-30,3,9,84,184,160,133,-7,16,-777,-271,-22,6,10,94,186,167,139,-7,0,38,4,-6,-7,-3,-2,-1,-2,0,1740,1720,1740,1036,925,921,893,905,910,924,925,925,8.7312163963,9.8031587956,8.5786455272,9.6526953789,9.0892975133,9.3928646618,9.9479843953,10.519116785,9.8648868631,10.22767988,13.786131152,13.84890687,14.361288068,12.987845942,14.95543988,13.473902411,16.514954486,16.478864066,14.715936839,16.188397772,-5.054914756,-4.045748074,-5.782642541,-3.335150563,-5.866142367,-4.08103775,-6.566970091,-5.959747281,-4.851049976,-5.960717892,0.6433527871,0.902513032,0.4765914182,0.2565500433,0.0966946544,0.0323891885,0.3250975293,0.0651338501,0.2279016767,0.1954333735,-0.153179235,-25.08363806,-9.087009707,-0.962062662,0.0966946544,0.2915026964,2.7308192458,5.9923142057,5.2091811818,4.332106446,0.4901735521,-24.18112503,-8.610418288,-0.705512619,0.1933893088,0.3238918849,3.055916775,6.0574480558,5.4370828585,4.5275398195 +050,3,5,51,119,Virginia,Middlesex County,10959,10959,10981,10855,10851,10781,10653,10683,10750,10614,10717,10561,10569,22,-126,-4,-70,-128,30,67,-136,103,-156,8,19,73,91,88,75,94,95,90,81,69,78,25,136,175,137,168,144,166,172,163,163,153,-6,-63,-84,-49,-93,-50,-71,-82,-82,-94,-75,0,1,3,2,3,3,0,-2,-2,-2,-1,29,-63,77,-23,-34,78,138,-51,188,-58,85,29,-62,80,-21,-31,81,138,-53,186,-60,84,-1,-1,0,0,-4,-1,0,-1,-1,-2,-1,393,387,363,393,381,381,435,410,376,376,377,377,6.6862062649,8.3847784023,8.1360946746,6.9982271158,8.8113985752,8.8648346008,8.425388504,7.5945806573,6.4855719523,7.3828679602,12.456493863,16.124573851,12.666420118,15.676028739,13.498312711,15.490132039,16.101853585,15.28292157,15.320988815,14.48177946,-5.770287598,-7.739795448,-4.530325444,-8.677801624,-4.686914136,-6.625297439,-7.676465081,-7.688340912,-8.835416862,-7.0989115,0.0915918666,0.276421266,0.1849112426,0.2799290846,0.2812148481,0,-0.187230856,-0.18752051,-0.187987593,-0.094652153,-5.770287598,7.0948124942,-2.12647929,-3.172529626,7.3115860517,12.877338683,-4.774386819,17.626927945,-5.451640192,8.0454330336,-5.678695732,7.3712337603,-1.941568047,-2.892600541,7.5928008999,12.877338683,-4.961617675,17.439407435,-5.639627785,7.9507808803 +050,3,5,51,121,Virginia,Montgomery County,94392,94419,94560,94761,95698,96658,97193,97427,98302,98230,98681,98872,98391,141,201,937,960,535,234,875,-72,451,191,-481,224,859,928,917,836,890,864,825,849,770,773,148,617,584,613,565,619,608,651,650,659,725,76,242,344,304,271,271,256,174,199,111,48,83,471,732,512,663,677,616,551,266,438,337,-7,-515,-130,149,-394,-720,3,-803,-11,-363,-870,76,-44,602,661,269,-43,619,-252,255,75,-533,-11,3,-9,-5,-5,6,0,6,-3,5,4,9237,9235,9360,9009,9602,9430,9422,9815,9409,9832,9830,9832,9.0745347848,9.7448794754,9.5344049575,8.6251811959,9.1460281574,8.8285333292,8.3955793459,8.6231850938,7.7953764306,7.8372528046,6.5180302238,6.132553463,6.3735989519,5.8292193489,6.3611139657,6.2126716021,6.6248753384,6.6019673863,6.6716273608,7.3505928633,2.556504561,3.6123260124,3.1608060055,2.795961847,2.7849141918,2.6158617272,1.7707040075,2.0212177075,1.1237490699,0.4866599413,4.9756762324,7.6866937241,5.3234627462,6.8403051828,6.9571472613,6.294417281,5.6072293571,2.7017281919,4.4342530865,3.4167583379,-5.440495244,-1.365123202,1.5492108382,-4.064977741,-7.399034015,0.0306546296,-8.17169723,-0.111725602,-3.674963174,-8.820711436,-0.464819011,6.3215705217,6.8726735844,2.7753274422,-0.441886754,6.3250719107,-2.564467873,2.59000259,0.7592899121,-5.403953098 +050,3,5,51,125,Virginia,Nelson County,15020,15015,14978,15019,14802,14799,14867,14764,14802,14800,14836,14867,14755,-37,41,-217,-3,68,-103,38,-2,36,31,-112,41,144,130,132,142,127,113,110,151,141,138,68,186,173,195,155,210,199,172,170,195,185,-27,-42,-43,-63,-13,-83,-86,-62,-19,-54,-47,0,3,12,13,6,7,3,5,3,3,5,-8,81,-190,48,76,-23,122,56,53,83,-68,-8,84,-178,61,82,-16,125,61,56,86,-63,-2,-1,4,-1,-1,-4,-1,-1,-1,-1,-2,102,102,102,102,102,102,102,102,102,102,102,102,9.600960096,8.7186881728,8.9186176143,9.5732488371,8.5721035402,7.6439153081,7.431930275,10.190309084,9.493990506,9.3173992303,12.401240124,11.602561953,13.175230567,10.449673026,14.174344437,13.461408374,11.62083643,11.472533405,13.12998687,12.490716359,-2.800280028,-2.88387378,-4.256612952,-0.876424189,-5.602240896,-5.817493066,-4.188906155,-1.282224322,-3.635996364,-3.173317129,0.200020002,0.8048019852,0.8783487044,0.404503472,0.4724781479,0.2029358046,0.3378150125,0.2024564719,0.201999798,0.3375869286,5.400540054,-12.7426981,3.2431336779,5.1237106452,-1.5524282,8.252722722,3.78352814,3.5767310028,5.588661078,-4.591182229,5.600560056,-11.93789611,4.1214823824,5.5282141172,-1.079950052,8.4556585267,4.1213431525,3.7791874747,5.790660876,-4.253595301 +050,3,5,51,127,Virginia,New Kent County,18429,18432,18543,18763,19148,19516,20021,20382,21015,21629,22275,22984,23648,111,220,385,368,505,361,633,614,646,709,664,58,168,203,174,176,176,206,204,227,212,221,66,134,130,144,130,166,158,152,178,193,199,-8,34,73,30,46,10,48,52,49,19,22,1,11,24,18,15,10,9,4,-3,2,5,110,173,280,316,431,337,573,555,598,690,639,111,184,304,334,446,347,582,559,595,692,644,8,2,8,4,13,4,3,3,2,-2,-2,551,551,551,551,551,552,551,552,552,552,552,552,9.0065941135,10.709292817,9.0006207325,8.9030528366,8.7122243398,9.9524120105,9.5675827784,10.34074344,9.3683024371,9.4784697204,7.1838310191,6.8581678141,7.4487895717,6.5761185725,8.2172115932,7.6334033867,7.1287871682,8.1086005831,8.5286904262,8.5349116487,1.8227630944,3.8511250033,1.5518311608,2.3269342641,0.4950127466,2.3190086238,2.4387956102,2.2321428571,0.8396120109,0.9435580717,0.5897174717,1.2661232888,0.9310986965,0.7587829122,0.4950127466,0.434814117,0.1875996623,-0.136661808,0.0883802117,0.2144450163,9.2746475098,14.771438369,16.345954893,21.802362344,16.68192956,27.683165447,26.029453147,27.241253644,30.491173026,27.406073083,9.8643649815,16.037561658,17.27705359,22.561145256,17.176942306,28.117979564,26.217052809,27.104591837,30.579553238,27.620518099 +050,3,5,51,131,Virginia,Northampton County,12389,12391,12410,12406,12209,12029,12034,12073,12003,11867,11789,11800,11673,19,-4,-197,-180,5,39,-70,-136,-78,11,-127,35,163,133,133,133,122,121,126,128,112,116,23,188,195,204,199,180,189,189,174,154,194,12,-25,-62,-71,-66,-58,-68,-63,-46,-42,-78,6,36,17,17,12,10,14,11,3,11,7,4,-14,-154,-126,60,87,-16,-81,-35,41,-56,10,22,-137,-109,72,97,-2,-70,-32,52,-49,-3,-1,2,0,-1,0,0,-3,0,1,0,326,325,279,282,266,265,284,257,257,255,256,252,13.136686009,10.80641885,10.974502847,11.054315754,10.121541461,10.051503572,10.557184751,10.82177883,9.4959515028,9.8836961615,15.151515152,15.843997562,16.833072036,16.539916054,14.933421828,15.700282439,15.835777126,14.710855597,13.056933316,16.529629787,-2.014829142,-5.037578712,-5.858569189,-5.485600299,-4.811880367,-5.648778867,-5.278592375,-3.889076767,-3.560981814,-6.645933626,2.9013539652,1.3812715824,1.402756003,0.9973818726,0.829634546,1.1629838844,0.9216589862,0.2536354413,0.932638094,0.5964299408,-1.12830432,-12.51269551,-10.39689743,4.9869093629,7.21782055,-1.329124439,-6.786761625,-2.959080149,3.4761965323,-4.771439526,1.7730496454,-11.13142393,-8.994141431,5.9842912355,8.047455096,-0.166140555,-5.865102639,-2.705444707,4.4088346263,-4.175009585 +050,3,5,51,133,Virginia,Northumberland County,12330,12331,12356,12452,12421,12298,12256,12243,12174,12270,12172,12069,12069,25,96,-31,-123,-42,-13,-69,96,-98,-103,0,21,110,87,105,87,97,79,92,86,80,82,27,162,181,185,164,159,192,165,166,192,216,-6,-52,-94,-80,-77,-62,-113,-73,-80,-112,-134,4,17,27,6,9,0,0,0,0,0,0,26,132,38,-48,29,50,45,168,-18,10,136,30,149,65,-42,38,50,45,168,-18,10,136,1,-1,-2,-1,-3,-1,-1,1,0,-1,-2,0,0,0,0,0,0,0,0,0,0,0,0,8.8681070622,6.9955373296,8.4954892997,7.0864217643,7.9186905588,6.4709014211,7.5274095893,7.0370673431,6.6003877728,6.7942663021,13.060303128,14.553933985,14.968243052,13.358312291,12.980121638,15.726747758,13.500245459,13.583176499,15.840930655,17.897091723,-4.192196066,-7.558396655,-6.472753752,-6.271890527,-5.061431079,-9.255846337,-5.97283587,-6.546109156,-9.240542882,-11.10282542,1.3705256369,2.1710288264,0.4854565314,0.7330781135,0,0,0,0,0,0,10.641728475,3.055522052,-3.883652251,2.3621405881,4.0817992571,3.6859565057,13.745704467,-1.47287456,0.8250484716,11.268539233,12.012254112,5.2265508785,-3.39819572,3.0952187016,4.0817992571,3.6859565057,13.745704467,-1.47287456,0.8250484716,11.268539233 +050,3,5,51,135,Virginia,Nottoway County,15853,15858,15847,15891,15758,15642,15515,15613,15502,15439,15381,15206,15160,-11,44,-133,-116,-127,98,-111,-63,-58,-175,-46,39,168,164,184,168,181,151,149,159,157,155,53,202,200,209,195,195,199,204,218,213,227,-14,-34,-36,-25,-27,-14,-48,-55,-59,-56,-72,1,0,-3,13,8,11,22,19,3,14,14,4,77,-93,-104,-110,99,-84,-26,-1,-133,12,5,77,-96,-91,-102,110,-62,-7,2,-119,26,-2,1,-1,0,2,2,-1,-1,-1,0,0,1836,1856,1909,1958,1980,1853,2215,2285,2252,2246,2247,2244,10.58667843,10.363676577,11.719745223,10.784093462,11.629401182,9.7059296159,9.6312336382,10.317975341,10.265799196,10.208786142,12.729220493,12.638629973,13.312101911,12.51725134,12.528912876,12.791258236,13.186386995,14.146658014,13.927485533,14.950931963,-2.142542063,-2.274953395,-1.592356688,-1.733157878,-0.899511694,-3.08532862,-3.555153356,-3.828682674,-3.661686337,-4.742145821,0,-0.18957945,0.8280254777,0.5135282601,0.7067591879,1.4141089507,1.2281438868,0.19467878,0.9154215843,0.9220839096,4.8522276136,-5.876962937,-6.624203822,-7.061013576,6.3608326908,-5.399325084,-1.68061795,-0.064892927,-8.696505051,0.7903576368,4.8522276136,-6.066542387,-5.796178344,-6.547485316,7.0675918787,-3.985216134,-0.452474064,0.1297858533,-7.781083467,1.7124415465 +050,3,5,51,137,Virginia,Orange County,33481,33541,33566,33982,34263,34607,34912,35173,35369,35882,36620,36941,37695,25,416,281,344,305,261,196,513,738,321,754,90,400,387,352,365,388,370,371,424,380,398,109,344,338,344,364,403,414,390,390,426,417,-19,56,49,8,1,-15,-44,-19,34,-46,-19,7,47,56,47,33,47,54,50,29,34,31,38,313,177,287,268,229,187,479,673,333,746,45,360,233,334,301,276,241,529,702,367,777,-1,0,-1,2,3,0,-1,3,2,0,-4,601,601,601,601,601,602,601,601,601,601,601,601,11.843429857,11.341490219,10.222157688,10.50072642,11.072269387,10.490204417,10.413888928,11.69622907,10.331561561,10.665094592,10.185349677,9.9054875815,9.9898359228,10.471957307,11.500321039,11.737688186,10.947214776,10.758323908,11.582224276,11.174232274,1.65808018,1.4360026376,0.2323217656,0.0287691135,-0.428051652,-1.247483769,-0.533325848,0.9379051612,-1.250662715,-0.509137682,1.3916030082,1.6411458715,1.3648903732,0.9493807448,1.3412285082,1.5310028068,1.4034890738,0.7999779316,0.9244028765,0.8306983225,9.2674838633,5.187193201,8.3345433425,7.7101224126,6.5349218806,5.3018060163,13.445425327,18.565005103,9.053710526,19.990353181,10.659086872,6.8283390725,9.6994337157,8.6595031574,7.8761503888,6.8328088231,14.848914401,19.364983035,9.9781134025,20.821051503 +050,3,5,51,139,Virginia,Page County,24042,24048,24062,23956,23841,23724,23787,23667,23633,23801,24005,23937,23933,14,-106,-115,-117,63,-120,-34,168,204,-68,-4,63,240,213,235,258,241,249,227,277,248,256,43,306,276,285,286,294,304,263,305,316,340,20,-66,-63,-50,-28,-53,-55,-36,-28,-68,-84,0,2,1,0,3,5,9,11,12,5,6,-3,-40,-48,-63,91,-71,15,194,219,-4,75,-3,-38,-47,-63,94,-66,24,205,231,1,81,-3,-2,-5,-4,-3,-1,-3,-1,1,-1,-1,194,194,194,194,194,194,194,194,194,194,194,194,9.9962514057,8.9126932653,9.8812151792,10.860642799,10.157204872,10.528541226,9.5711936586,11.588503535,10.34583455,10.695634009,12.745220542,11.548841978,11.983601388,12.039317211,12.390947022,12.854122622,11.089092212,12.759904614,13.182595636,14.205138918,-2.748969137,-2.636148712,-2.102386208,-1.178674412,-2.23374215,-2.325581395,-1.517898554,-1.171401079,-2.836761086,-3.509504909,0.083302095,0.0418436304,0,0.1262865442,0.2107303915,0.3805496829,0.4638023359,0.502029034,0.208585374,0.2506789221,-1.666041901,-2.008494257,-2.649006623,3.8306918398,-2.99237156,0.6342494715,8.1797866509,9.1620298707,-0.166868299,3.133486526,-1.582739806,-1.966650627,-2.649006623,3.956978384,-2.781641168,1.0147991543,8.6435889868,9.6640589047,0.0417170748,3.3841654481 +050,3,5,51,141,Virginia,Patrick County,18490,18505,18474,18339,18339,18256,18185,17972,17830,17727,17659,17592,17493,-31,-135,0,-83,-71,-213,-142,-103,-68,-67,-99,45,141,165,131,133,124,165,156,151,130,127,78,259,244,266,249,263,270,270,266,218,240,-33,-118,-79,-135,-116,-139,-105,-114,-115,-88,-113,1,3,10,4,3,5,5,2,0,-3,-3,3,-18,71,52,46,-78,-40,11,48,23,16,4,-15,81,56,49,-73,-35,13,48,20,13,-2,-2,-2,-4,-4,-1,-2,-2,-1,1,1,203,203,234,237,263,262,271,261,299,295,295,295,7.6603373808,8.9972190414,7.159448012,7.2994703768,6.8589761319,9.2173621585,8.7746435301,8.534448652,7.3756772858,7.239561066,14.071116182,13.304978461,14.537505124,13.665925743,14.547667118,15.082956259,15.186883033,15.034194314,12.368443448,13.681060282,-6.410778801,-4.30775942,-7.378057112,-6.366455366,-7.688690987,-5.865594101,-6.412239503,-6.499745662,-4.992766163,-6.441499216,0.1629859017,0.5452860025,0.2186090996,0.1646497077,0.2765716182,0.2793140048,0.1124954299,0,-0.170207937,-0.171013254,-0.97791541,3.8715306178,2.8419182948,2.5246288521,-4.314517244,-2.234512038,0.6187248643,2.7129373198,1.3049275198,0.9120706855,-0.814929509,4.4168166203,3.0605273945,2.6892785599,-4.037945626,-1.955198034,0.7312202942,2.7129373198,1.1347195824,0.741057432 +050,3,5,51,143,Virginia,Pittsylvania County,63506,63471,63591,63269,62900,62566,62386,62027,61744,61334,60938,60470,59850,120,-322,-369,-334,-180,-359,-283,-410,-396,-468,-620,150,542,557,543,515,495,515,491,480,500,481,204,641,690,721,716,690,679,743,739,762,809,-54,-99,-133,-178,-201,-195,-164,-252,-259,-262,-328,6,19,3,19,13,10,20,16,8,7,8,155,-241,-233,-170,19,-170,-138,-171,-143,-212,-301,161,-222,-230,-151,32,-160,-118,-155,-135,-205,-293,13,-1,-6,-5,-11,-4,-1,-3,-2,-1,1,839,1048,1049,1076,1057,1046,1076,1073,1062,1070,1069,1066,8.5448525934,8.8294271969,8.6557314332,8.2431653755,7.9573677992,8.3218201356,7.9786801865,7.8513478147,8.2366895098,7.9953457447,10.105628252,10.937710531,11.493153524,11.460400794,11.092088447,10.97187548,12.073644356,12.08780424,12.552714813,13.447473404,-1.560775658,-2.108283334,-2.83742209,-3.217235418,-3.134720648,-2.650055344,-4.094964169,-4.236456425,-4.316025303,-5.45212766,0.2995428031,0.0475552632,0.3028708973,0.2080799027,0.160754905,0.323177481,0.259997725,0.1308557969,0.1153136531,0.1329787234,-3.799463976,-3.693458774,-2.709897502,0.3041167808,-2.732833386,-2.229924619,-2.778725686,-2.33904737,-3.492356352,-5.003324468,-3.499921173,-3.64590351,-2.407026605,0.5121966835,-2.572078481,-1.906747138,-2.518727961,-2.208191573,-3.377042699,-4.870345745 +050,3,5,51,145,Virginia,Powhatan County,28046,28073,28133,28138,28186,28315,28504,28068,28463,28722,29199,29734,30148,60,5,48,129,189,-436,395,259,477,535,414,65,247,240,221,232,242,239,241,241,265,259,22,192,190,197,201,193,206,195,244,232,277,43,55,50,24,31,49,33,46,-3,33,-18,0,0,11,2,18,12,14,3,0,2,2,20,-49,-14,106,146,-509,348,211,479,501,434,20,-49,-3,108,164,-497,362,214,479,503,436,-3,-1,1,-3,-6,12,0,-1,1,-1,-4,2395,2388,2392,2319,2289,2205,1437,1390,1139,1117,1121,1119,8.7789447495,8.5221220084,7.8228703917,8.1662824055,8.5554691367,8.4555376696,8.428783772,8.321679529,8.9932635366,8.6503456798,6.8241189956,6.7466799233,6.9733279057,7.0750981186,6.8231634024,7.2880366525,6.8199702719,8.4252689007,7.8733476999,9.2515280051,1.9548257539,1.7754420851,0.849542486,1.0911842869,1.7323057343,1.1675010171,1.6088135,-0.103589372,1.1199158366,-0.601182325,0,0.3905972587,0.0707952072,0.6335908763,0.424238139,0.4953034618,0.1049226196,0,0.0678736871,0.0667980361,-1.741572035,-0.497123784,3.7521459797,5.1391259966,-17.99476773,12.311828908,7.3795575763,16.539769686,17.002358611,14.495173842,-1.741572035,-0.106526525,3.8229411869,5.7727168729,-17.57052959,12.80713237,7.4844801959,16.539769686,17.070232298,14.561971878 +050,3,5,51,147,Virginia,Prince Edward County,23368,23363,23364,22328,23187,22733,22994,23139,23049,22698,22879,22827,23006,1,-1036,859,-454,261,145,-90,-351,181,-52,179,53,182,208,201,216,214,241,203,184,214,220,25,231,219,223,209,277,212,245,255,233,263,28,-49,-11,-22,7,-63,29,-42,-71,-19,-43,2,11,24,17,38,44,39,53,38,42,36,-29,-1008,801,-463,211,161,-158,-366,212,-74,186,-27,-997,825,-446,249,205,-119,-313,250,-32,222,0,10,45,14,5,3,0,4,2,-1,0,4318,4281,3366,4360,4095,4153,4452,4228,3895,4052,4057,4060,7.966383612,9.1398440075,8.7543554007,9.4473724495,9.2775236815,10.435610981,8.8748989005,8.074247976,9.3641972608,9.6000698187,10.1111792,9.6232011425,9.712543554,9.1412076016,12.008757289,9.1798735602,10.71108488,11.189854532,10.195597952,11.476447101,-2.144795588,-0.483357135,-0.958188153,0.3061648479,-2.731233607,1.255737421,-1.836185979,-3.115606556,-0.831400691,-1.876377283,0.4814847238,1.0545973855,0.7404181185,1.6620377458,1.9075282336,1.6887503248,2.3170918312,1.6675077342,1.8378331073,1.5709205158,-44.12150924,35.19718774,-20.16550523,9.2286832725,6.9798192183,-6.84160388,-16.00104925,9.3029378853,-3.238086903,8.1164226649,-43.64002451,36.251785126,-19.42508711,10.890721018,8.8873474519,-5.152853555,-13.68395742,10.97044562,-1.400253796,9.6873431807 +050,3,5,51,149,Virginia,Prince George County,35725,35715,35643,36734,37155,37376,37465,38306,38026,38049,38170,38528,38686,-72,1091,421,221,89,841,-280,23,121,358,158,97,419,382,382,374,444,436,378,436,402,386,30,216,246,225,251,199,220,265,242,265,302,67,203,136,157,123,245,216,113,194,137,84,55,75,354,152,136,189,82,54,-15,16,22,-211,808,-62,-86,-176,403,-582,-145,-58,208,49,-156,883,292,66,-40,592,-500,-91,-73,224,71,17,5,-7,-2,6,4,4,1,0,-3,3,4772,4682,4784,4835,4845,4685,5001,4471,4333,4085,3995,3990,11.578263813,10.339834075,10.250768137,9.9945217194,11.7195233,11.423780328,9.9375616168,11.440716882,10.482672299,9.9981868573,5.9687469776,6.6586366036,6.0377561015,6.7075533464,5.252669227,5.7642928261,6.96680907,6.3501226728,6.9102193017,7.8224156241,5.6095168355,3.6811974719,4.2130120353,3.286968373,6.4668540735,5.659487502,2.9707525468,5.0905942088,3.5724529975,2.1757712332,2.0724815895,9.5819404783,4.0788396774,3.6343715343,4.9887159995,2.1485091443,1.4196516595,-0.393602645,0.417220788,0.5698448468,22.32753499,-1.678192965,-2.307764554,-4.703304339,10.637315068,-15.24917466,-3.812027604,-1.521930227,5.4238702443,1.269199886,24.40001658,7.9037475132,1.7710751231,-1.068932804,15.626031067,-13.10066551,-2.392375945,-1.915532872,5.8410910324,1.8390447328 +050,3,5,51,153,Virginia,Prince William County,402002,402006,406183,419149,429716,437900,444004,451242,456805,463400,466658,471774,475533,4177,12966,10567,8184,6104,7238,5563,6595,3258,5116,3759,1593,6514,6646,6688,6661,6717,6548,6530,6480,6197,6300,446,1505,1490,1687,1708,1778,1812,1974,2019,2159,2325,1147,5009,5156,5001,4953,4939,4736,4556,4461,4038,3975,450,1581,2424,1782,2691,3092,2893,2766,1476,2183,1700,2378,6331,2987,1433,-1484,-760,-2066,-720,-2697,-1130,-1952,2828,7912,5411,3215,1207,2332,827,2046,-1221,1053,-252,202,45,0,-32,-56,-33,0,-7,18,25,36,2520,2530,2516,2185,2473,2451,2638,2708,2740,2771,3076,3074,15.785162819,15.658555836,15.416958655,15.105952575,15.005931331,14.422160967,14.192489717,13.93461483,13.207137012,13.300862339,3.6470172004,3.5105699964,3.8888171726,3.8734374717,3.9720925868,3.9909828456,4.2903483463,4.3416647134,4.6012923685,4.9086515776,12.138145619,12.14798584,11.528141482,11.232515104,11.033838744,10.431178122,9.9021413707,9.5929501171,8.605844643,8.3922107617,3.8311855108,5.7111554841,4.1078080626,6.1027050563,6.9075985818,6.3719168721,6.0117039138,3.1739956003,4.6524415195,3.5891215836,15.341704914,7.0376326035,3.3033046878,-3.365445672,-1.697857349,-4.550425253,-1.564868698,-5.799638302,-2.408272523,-4.121156077,19.172890425,12.748788088,7.4111127503,2.7372593842,5.2097412331,1.8214916188,4.4468352161,-2.625642702,2.2441689968,-0.532034494 +050,3,5,51,155,Virginia,Pulaski County,34872,34857,34830,34741,34734,34551,34343,34357,34268,34255,34097,34009,33935,-27,-89,-7,-183,-208,14,-89,-13,-158,-88,-74,69,283,326,354,346,312,335,342,322,302,296,76,408,428,479,448,401,435,444,465,500,519,-7,-125,-102,-125,-102,-89,-100,-102,-143,-198,-223,2,2,1,4,1,6,9,7,1,6,6,-16,36,97,-59,-100,100,4,84,-14,103,143,-14,38,98,-55,-99,106,13,91,-13,109,149,-6,-2,-3,-3,-7,-3,-2,-2,-2,1,0,960,957,995,1094,1154,1148,1124,1153,1136,1087,1091,1088,8.1355737304,9.3846707449,10.218662048,10.044416059,9.0829694323,9.7632058288,9.9820498227,9.4218164794,8.8685284703,8.7130578123,11.729025025,12.320978769,13.82694667,13.00548669,11.673944687,12.677595628,12.959152401,13.606039326,14.682994156,15.277287178,-3.593451294,-2.936308024,-3.608284621,-2.96107063,-2.590975255,-2.9143898,-2.977102579,-4.184222846,-5.814465686,-6.564229365,0.0574952207,0.0287873336,0.1154651079,0.0290301042,0.1746724891,0.262295082,0.2043109613,0.0292602996,0.1761959299,0.1766160367,1.0349139728,2.7923713566,-1.703110341,-2.903010422,2.9112081514,0.116575592,2.4517315354,-0.409644195,3.0246967962,4.2093488755,1.0924091935,2.8211586902,-1.587645233,-2.873980318,3.0858806405,0.378870674,2.6560424967,-0.380383895,3.200892726,4.3859649123 +050,3,5,51,157,Virginia,Rappahannock County,7373,7507,7502,7478,7414,7433,7344,7409,7384,7409,7373,7372,7260,-5,-24,-64,19,-89,65,-25,25,-36,-1,-112,18,78,55,64,56,65,53,66,75,50,57,29,67,80,69,67,63,55,70,66,72,86,-11,11,-25,-5,-11,2,-2,-4,9,-22,-29,0,-1,-1,-4,1,7,7,8,4,5,6,7,-35,-37,29,-79,58,-30,20,-48,16,-90,7,-36,-38,25,-78,65,-23,28,-44,21,-84,-1,1,-1,-1,0,-2,0,1,-1,0,1,35,35,35,35,35,35,35,35,35,35,35,35,10.41388518,7.3865162503,8.6212702903,7.5793462814,8.8117670982,7.1655512743,8.9231393227,10.147476661,6.7819599864,7.7911427009,8.9452603471,10.744023637,9.2948070317,9.0681464438,8.5406358029,7.4359494355,9.4639356452,8.9297794615,9.7660223805,11.755057408,1.4686248331,-3.357507387,-0.673536741,-1.488800162,0.2711312953,-0.270398161,-0.540796323,1.2176971993,-2.984062394,-3.963914707,-0.133511348,-0.134300295,-0.538829393,0.1353454693,0.9489595337,0.9463935645,1.0815926452,0.5411987552,0.6781959986,0.8201202843,-4.672897196,-4.969110932,3.9065131003,-10.69229208,7.8628075646,-4.055972419,2.7039816129,-6.494385063,2.1702271957,-12.30180426,-4.806408545,-5.103411228,3.3676837071,-10.55694661,8.8117670982,-3.109578855,3.7855742581,-5.953186308,2.8484231943,-11.48168398 +050,3,5,51,159,Virginia,Richmond County,9254,9250,9276,9204,9076,8948,8880,8779,8755,8882,8982,9066,9071,26,-72,-128,-128,-68,-101,-24,127,100,84,5,18,69,63,74,63,55,76,86,72,69,72,7,101,116,105,105,125,114,142,129,99,110,11,-32,-53,-31,-42,-70,-38,-56,-57,-30,-38,3,12,2,2,1,3,9,10,4,8,8,12,-53,-80,-102,-31,-33,5,171,152,106,36,15,-41,-78,-100,-30,-30,14,181,156,114,44,0,1,3,3,4,-1,0,2,1,0,-1,1792,1796,1792,1726,1652,1583,1573,1492,1611,1664,1668,1665,7.4675324675,6.8927789934,8.2112738571,7.0675342158,6.2291182966,8.668871906,9.7522254352,8.0609046126,7.6462765957,7.9395710426,10.930735931,12.691466083,11.651131824,11.779223693,14.157087038,13.003307859,16.102511765,14.442454098,10.970744681,12.129900204,-3.463203463,-5.79868709,-3.439857967,-4.711689477,-7.927968741,-4.334435953,-6.35028633,-6.381549485,-3.324468085,-4.190329161,1.2987012987,0.2188183807,0.2219263205,0.1121830828,0.3397700889,1.0265769362,1.1339797018,0.447828034,0.8865248227,0.8821745603,-5.735930736,-8.75273523,-11.31824234,-3.477675567,-3.737470978,0.5703205201,19.3910529,17.017465293,11.746453901,3.9697855213,-4.437229437,-8.533916849,-11.09631602,-3.365492484,-3.397700889,1.5968974564,20.525032602,17.465293327,12.632978723,4.8519600816 +050,3,5,51,161,Virginia,Roanoke County,92376,92476,92416,92841,92771,93354,93428,93439,93520,93900,94161,94423,94509,-60,425,-70,583,74,11,81,380,261,262,86,193,807,802,856,878,823,860,840,849,819,773,235,956,954,955,940,1064,993,1017,1059,1045,1064,-42,-149,-152,-99,-62,-241,-133,-177,-210,-226,-291,38,190,220,145,214,233,162,153,74,124,96,-52,388,-133,551,-61,26,57,415,405,366,282,-14,578,87,696,153,259,219,568,479,490,378,-4,-4,-5,-14,-17,-7,-5,-11,-8,-2,-1,2328,2312,2288,2287,2203,2179,2143,2325,2373,2346,2347,2347,8.7122214005,8.6416826498,9.1981195433,9.4013341757,8.808403838,9.1998780481,8.9638245651,9.0289852761,8.6857845841,8.1828382699,10.320797595,10.27950779,10.261920752,10.06520971,11.387778473,10.622649886,10.852630456,11.262303189,11.082594494,11.263311668,-1.608576194,-1.637825141,-1.063801209,-0.663875534,-2.579374635,-1.422771838,-1.888805891,-2.233317913,-2.39680991,-3.080473398,2.0512045429,2.3705363877,1.5580926797,2.2914413594,2.4937522409,1.7330002835,1.6326966172,0.7869786931,1.3150638442,1.0162386467,4.1887755928,-1.433096998,5.9207521827,-0.653167864,0.2782727822,0.609759359,4.428556184,4.3071131176,3.8815594112,2.9852010247,6.2399801357,0.9374393897,7.4788448623,1.6382734953,2.7720250231,2.3427596425,6.0612528012,5.0940918106,5.1966232554,4.0014396714 +050,3,5,51,163,Virginia,Rockbridge County,22307,22357,22348,22449,22384,22337,22443,22410,22467,22736,22904,22774,22757,-9,101,-65,-47,106,-33,57,269,168,-130,-17,51,184,203,226,184,192,207,198,191,186,147,64,231,253,249,228,253,279,258,259,272,267,-13,-47,-50,-23,-44,-61,-72,-60,-68,-86,-120,0,2,12,21,27,21,18,30,14,23,19,7,145,-22,-40,126,9,113,297,224,-67,84,7,147,-10,-19,153,30,131,327,238,-44,103,-3,1,-5,-5,-3,-2,-2,2,-2,0,0,175,174,172,182,175,175,179,196,502,502,503,502,8.2148358149,9.0558294114,10.107108517,8.2179544439,8.5613002475,9.2252155893,8.7604804991,8.3698510079,8.1439642716,6.457139092,10.313190615,11.286329266,11.135708057,10.183117463,11.28129668,12.433986229,11.415171559,11.349693252,11.909453128,11.728273045,-2.098354801,-2.230499855,-1.028599539,-1.965163019,-2.719996433,-3.20877064,-2.65469106,-2.979842244,-3.765488857,-5.271133953,0.0892916936,0.5353199652,0.9391561012,1.2058954891,0.9363922146,0.8021926599,1.3273455302,0.6134969325,1.0070493454,0.8345962092,6.4736477889,-0.981419936,-1.788868764,5.6275122823,0.4013109491,5.035987254,13.140720749,9.8159509202,-2.933578528,3.6897937669,6.5629394826,-0.446099971,-0.849712663,6.8334077713,1.3377031637,5.838179914,14.468066279,10.429447853,-1.926529183,4.5243899761 +050,3,5,51,165,Virginia,Rockingham County,76314,76324,76413,76868,77149,77437,77897,78469,79401,80448,81353,82140,82346,89,455,281,288,460,572,932,1047,905,787,206,221,880,839,809,868,836,898,955,946,919,889,167,634,695,734,687,710,685,759,750,776,837,54,246,144,75,181,126,213,196,196,143,52,12,35,93,104,115,87,104,94,42,70,62,34,177,63,122,183,366,616,759,670,576,90,46,212,156,226,298,453,720,853,712,646,152,-11,-3,-19,-13,-19,-7,-1,-2,-3,-2,2,1471,1471,1548,1527,1600,1657,1586,1659,1692,1635,1633,1633,11.482179787,10.894901212,10.466665804,11.1759177,10.69286162,11.376448977,11.948776658,11.693376432,11.242071526,10.80943059,8.2723886196,9.0249777622,9.4963321387,8.8454555989,9.081258074,8.6780262241,9.4964622863,9.2706472766,9.492761158,10.177157934,3.2097911679,1.86992345,0.9703336654,2.330462101,1.6116035455,2.6984227529,2.4523143717,2.4227291549,1.749310368,0.6322726554,0.4566776052,1.2076588948,1.3455293494,1.4806803404,1.1127738767,1.3175397479,1.1761099538,0.5191562475,0.8563057746,0.7538635507,2.3094838891,0.8180915094,1.5784094291,2.3562130635,4.6813245846,7.803889276,9.4964622863,8.2817782338,7.0461732307,1.0943180575,2.7661614942,2.0257504042,2.9239387784,3.8368934039,5.7940984613,9.1214290239,10.67257224,8.8009344812,7.9024790052,1.8481816082 +050,3,5,51,167,Virginia,Russell County,28897,28917,28873,28681,28429,28337,28082,27863,27423,27054,26820,26739,26647,-44,-192,-252,-92,-255,-219,-440,-369,-234,-81,-92,70,250,268,287,270,235,244,248,239,276,260,111,360,328,356,345,357,352,388,353,325,366,-41,-110,-60,-69,-75,-122,-108,-140,-114,-49,-106,2,-2,9,8,17,6,3,0,0,0,0,-1,-80,-202,-27,-200,-103,-335,-229,-120,-33,14,1,-82,-193,-19,-183,-97,-332,-229,-120,-33,14,-4,0,1,-4,3,0,0,0,0,1,0,434,434,434,434,434,434,434,429,434,432,432,432,8.6874934844,9.385396603,10.111686573,9.5712437299,8.4011082313,8.8268277683,9.1047598069,8.872554479,10.306391083,9.7403813734,12.509990618,11.486604798,12.542719233,12.229922544,12.762534632,12.733784322,14.244543569,13.104651594,12.13614892,13.711459933,-3.822497133,-2.101208195,-2.43103266,-2.658678814,-4.361426401,-3.906956553,-5.139783762,-4.232097115,-1.829757837,-3.97107856,-0.069499948,0.3151812292,0.2818588592,0.6026338645,0.2144963804,0.1085265709,0,0,0,0,-2.779997915,-7.074067589,-0.95127365,-7.08981017,-3.682187863,-12.11880042,-8.407217725,-4.454839069,-1.23228589,0.524482074,-2.849497863,-6.75888636,-0.669414791,-6.487176306,-3.467691483,-12.01027385,-8.407217725,-4.454839069,-1.23228589,0.524482074 +050,3,5,51,169,Virginia,Scott County,23177,23166,23127,23053,22956,22769,22521,22298,22070,21897,21631,21578,21629,-39,-74,-97,-187,-248,-223,-228,-173,-266,-53,51,63,185,217,180,180,180,162,190,158,163,155,49,280,315,322,306,298,303,308,310,223,267,14,-95,-98,-142,-126,-118,-141,-118,-152,-60,-112,1,-2,1,3,4,4,5,2,-1,-2,2,-56,25,5,-46,-126,-108,-92,-55,-111,10,163,-55,23,6,-43,-122,-104,-87,-53,-112,8,165,2,-2,-5,-2,0,-1,0,-2,-2,-1,-2,652,611,705,683,706,707,775,800,796,792,793,794,8.0121264617,9.4329370341,7.8731547294,7.9487745639,8.0323077266,7.3025604039,8.6428457707,7.259694909,7.5447244787,7.1747633485,12.126461672,13.692973114,14.084199016,13.512916759,13.297931681,13.658492607,14.010507881,14.243705201,10.321923673,12.359108478,-4.11433521,-4.26003608,-6.211044286,-5.564142195,-5.265623954,-6.355932203,-5.36766211,-6.984010292,-2.777199195,-5.184345129,-0.086617583,0.0434697559,0.1312192455,0.1766394348,0.1784957273,0.2253876668,0.0909773239,-0.045947436,-0.092573306,0.0925775916,1.0827197921,0.2173487796,-2.012028431,-5.564142195,-4.819384636,-4.147133069,-2.501876407,-5.100165411,0.4628665324,7.5450737149,0.9961022087,0.2608185355,-1.880809185,-5.38750276,-4.640888909,-3.921745402,-2.410899083,-5.146112847,0.3702932259,7.6376513065 +050,3,5,51,171,Virginia,Shenandoah County,41993,41991,42048,42266,42532,42514,42737,42863,42962,43319,43464,43557,43905,57,218,266,-18,223,126,99,357,145,93,348,121,473,468,464,478,432,485,440,473,471,478,119,431,456,472,463,508,509,433,483,526,543,2,42,12,-8,15,-76,-24,7,-10,-55,-65,12,55,31,30,32,49,77,72,58,29,35,45,123,224,-34,183,156,50,279,101,120,378,57,178,255,-4,215,205,127,351,159,149,413,-2,-2,-1,-6,-7,-3,-4,-1,-4,-1,0,427,427,427,427,427,427,427,427,427,427,427,427,11.21996347,11.037996179,10.911741881,11.213944704,10.093457944,11.302068162,10.19923274,10.900752452,10.824973282,10.930461229,10.223687644,10.754970636,11.099875362,10.862042674,11.869158879,11.861345762,10.036972219,11.131212334,12.08903598,12.416821019,0.9962758261,0.2830255431,-0.188133481,0.3519020305,-1.775700935,-0.5592776,0.1622605209,-0.230459883,-1.264062698,-1.486359791,1.3046469151,0.7311493196,0.7055005526,0.7507243317,1.1448598131,1.7943489659,1.6689653574,1.3366673196,0.666505786,0.8003475795,2.9176649192,5.2831434704,-0.799567293,4.2932047718,3.6448598131,1.1651616662,6.4672407598,2.3276448152,2.7579549764,8.6437538588,4.2223118343,6.0142927899,-0.09406674,5.0439291035,4.7897196262,2.9595106321,8.1362061172,3.6643121349,3.4244607623,9.4441014383 +050,3,5,51,173,Virginia,Smyth County,32208,32211,32198,32054,31911,31789,31593,31444,31143,30772,30509,30182,30090,-13,-144,-143,-122,-196,-149,-301,-371,-263,-327,-92,67,344,324,290,283,319,282,317,266,271,256,79,437,420,449,404,407,417,458,480,451,489,-12,-93,-96,-159,-121,-88,-135,-141,-214,-180,-233,3,13,13,26,20,13,21,22,12,19,16,1,-64,-55,16,-93,-71,-187,-252,-59,-167,126,4,-51,-42,42,-73,-58,-166,-230,-47,-148,142,-5,0,-5,-5,-2,-3,0,0,-2,1,-1,774,773,772,757,773,774,887,842,752,768,769,770,10.707837888,10.130540139,9.1051805338,8.9299801205,10.121040024,9.0114560532,10.239844949,8.6813204745,8.9304839268,8.4948234669,13.60268941,13.132181662,14.09733124,12.748098829,12.913051065,13.325450972,14.794476298,15.665540706,14.862170668,16.226440138,-2.894851522,-3.001641523,-4.992150706,-3.818118709,-2.792011041,-4.313994919,-4.554631349,-6.984220231,-5.931686741,-7.731616671,0.4046566644,0.4064722895,0.8163265306,0.6310940015,0.4124561765,0.6710658763,0.7106516999,0.3916385176,0.6261224893,0.5309264667,-1.992155886,-1.719690456,0.5023547881,-2.934587107,-2.252645272,-5.975681851,-8.140192199,-1.925556045,-5.503287143,4.1810459251,-1.587499222,-1.313218166,1.3186813187,-2.303493105,-1.840189095,-5.304615975,-7.429540499,-1.533917527,-4.877164654,4.7119723918 +050,3,5,51,175,Virginia,Southampton County,18570,18573,18642,18638,18506,18330,18224,18139,18090,17866,17757,17797,17636,69,-4,-132,-176,-106,-85,-49,-224,-109,40,-161,44,185,173,171,155,189,165,148,165,176,155,63,199,184,183,169,160,165,193,209,191,219,-19,-14,-11,-12,-14,29,0,-45,-44,-15,-64,0,3,2,4,2,3,5,4,2,3,4,79,8,-125,-170,-94,-115,-53,-183,-66,52,-101,79,11,-123,-166,-92,-112,-48,-179,-64,55,-97,9,-1,2,2,0,-2,-1,0,-1,0,0,1567,1642,1740,1721,1678,1705,1703,1671,1577,1576,1577,1576,9.9248927039,9.315097997,9.2843956999,8.4806040379,10.395181916,9.1087250545,8.2322839025,9.2636779609,9.900433144,8.7489063867,10.675965665,9.907387465,9.9359322402,9.24659408,8.8001540027,9.1087250545,10.735343197,11.733992084,10.74422006,12.361358056,-0.751072961,-0.592289468,-0.65153654,-0.765990042,1.595027913,0,-2.503059295,-2.470314123,-0.843786916,-3.612451669,0.160944206,0.1076889942,0.2171788468,0.1094271489,0.1650028876,0.2760219713,0.2224941595,0.1122870056,0.1687573831,0.2257782293,0.4291845494,-6.730562137,-9.230100988,-5.143075997,-6.325110689,-2.925832896,-10.1791078,-3.705471184,2.9251279743,-5.700900291,0.5901287554,-6.622873142,-9.012922141,-5.033648848,-6.160107802,-2.649810925,-9.956613639,-3.593184179,3.0938853575,-5.475122061 +050,3,5,51,177,Virginia,Spotsylvania County,122397,122455,122981,124557,125867,127449,128881,130042,131401,132889,134227,136447,138449,526,1576,1310,1582,1432,1161,1359,1488,1338,2220,2002,393,1626,1552,1561,1579,1594,1643,1516,1607,1510,1560,129,759,787,766,798,850,868,968,987,1023,1104,264,867,765,795,781,744,775,548,620,487,456,43,150,252,162,191,204,142,139,79,88,83,212,558,310,640,485,223,449,807,649,1651,1467,255,708,562,802,676,427,591,946,728,1739,1550,7,1,-17,-15,-25,-10,-7,-6,-10,-6,-4,524,524,524,524,524,524,524,524,524,524,524,524,13.137376888,12.394978117,12.324527468,12.320056178,12.312540794,12.568705224,11.472246396,12.0322257,11.157333176,11.349746813,6.1323917944,6.2853400633,6.0477822167,6.2263488472,6.5656585162,6.6400706846,7.325286617,7.3900477695,7.5589085025,8.0321285141,7.0049850932,6.1096380539,6.276745251,6.0937073304,5.7468822777,5.9286345398,4.146959779,4.6421779302,3.5984246732,3.3176182993,1.2119351372,2.012586653,1.2790348813,1.4902664534,1.5757580439,1.0862788447,1.0518748345,0.5915033169,0.6502286884,0.6038647343,4.5083987105,2.4758010414,5.052977309,3.7841844497,1.7225198225,3.4347831076,6.1069279958,4.8593120592,12.19917687,10.673127292,5.7203338477,4.4883876945,6.3320121903,5.2744509031,3.2982778664,4.5210619523,7.1588028302,5.4508153761,12.849405558,11.276992026 +050,3,5,51,179,Virginia,Stafford County,128961,128993,129857,132251,133449,136034,138937,141035,143641,146868,149891,153775,156748,864,2394,1198,2585,2903,2098,2606,3227,3023,3884,2973,433,1731,1628,1702,1691,1719,1691,1683,1771,1785,1763,198,570,584,690,674,654,731,753,813,863,920,235,1161,1044,1012,1017,1065,960,930,958,922,843,97,127,517,320,450,481,338,219,57,153,130,503,1105,-391,1256,1449,564,1312,2088,2016,2815,2010,600,1232,126,1576,1899,1045,1650,2307,2073,2968,2140,29,1,28,-3,-13,-12,-4,-10,-8,-6,-10,3593,3662,3581,2824,2996,2941,3159,3346,3553,3607,4418,4424,13.208295817,12.254422281,12.631594572,12.299478854,12.279799409,11.880172547,11.586560141,11.935611051,11.756337555,11.355036503,4.3493521754,4.3959352653,5.1209167183,4.9023351553,4.671895761,5.1356629993,5.1840046264,5.4791935544,5.6838763642,5.925487001,8.8589436416,7.8584870154,7.5106778535,7.3971436988,7.6079036475,6.7445095477,6.4025555146,6.456417497,6.0724611909,5.429549502,0.9690661865,3.8916070756,2.3749178983,3.2730724331,3.4360578915,2.3746294033,1.5076985567,0.3841501016,1.0076860761,0.8372970762,8.4316388664,-2.943168988,9.321552751,10.539293235,4.028974326,9.2174963819,14.374769801,13.586782541,18.540106564,12.945900948,9.4007050529,0.9484380881,11.696470649,13.812365668,7.4650322175,11.592125785,15.882468357,13.970932642,19.547792641,13.783198024 +050,3,5,51,181,Virginia,Surry County,7058,7064,7045,6923,6844,6792,6783,6674,6560,6508,6435,6407,6385,-19,-122,-79,-52,-9,-109,-114,-52,-73,-28,-22,16,60,65,69,56,55,62,61,65,65,60,42,69,72,78,57,78,86,87,86,56,78,-26,-9,-7,-9,-1,-23,-24,-26,-21,9,-18,0,0,0,1,0,1,1,1,0,1,0,7,-112,-75,-44,-7,-89,-90,-25,-53,-38,-2,7,-112,-75,-43,-7,-88,-89,-24,-53,-37,-2,0,-1,3,0,-1,2,-1,-2,1,0,-2,0,0,0,0,0,0,0,0,0,0,0,0,8.5910652921,9.4428706327,10.120269874,8.2504604052,8.1741844393,9.3698050476,9.3357820631,10.044039249,10.123033795,9.3808630394,9.8797250859,10.459795162,11.440305075,8.3977900552,11.59247975,12.996826356,13.31496786,13.289036545,8.7213829622,12.195121951,-1.288659794,-1.01692453,-1.320035201,-0.14732965,-3.418295311,-3.627021309,-3.979185797,-3.244997296,1.4016508332,-2.814258912,0,0,0.1466705779,0,0.1486215353,0.1511258879,0.1530456076,0,0.1557389815,0,-16.03665521,-10.89561996,-6.453505427,-1.031307551,-13.22731664,-13.60132991,-3.82614019,-8.18975508,-5.918081296,-0.312695435,-16.03665521,-10.89561996,-6.306834849,-1.031307551,-13.0786951,-13.45020402,-3.673094582,-8.18975508,-5.762342314,-0.312695435 +050,3,5,51,183,Virginia,Sussex County,12087,12071,12013,12088,11927,11765,11724,11692,11425,11369,11194,11092,10925,-58,75,-161,-162,-41,-32,-267,-56,-175,-102,-167,31,103,105,108,92,101,110,90,86,83,78,17,142,137,152,114,134,162,131,132,139,151,14,-39,-32,-44,-22,-33,-52,-41,-46,-56,-73,1,6,6,4,3,5,0,1,1,1,1,-81,106,-135,-124,-20,-2,-216,-15,-130,-48,-94,-80,112,-129,-120,-17,3,-216,-14,-129,-47,-93,8,2,0,2,-2,-2,1,-1,0,1,-1,2593,2539,2593,2615,2648,2652,2661,2555,2618,2596,2601,2601,8.54736318,8.7445346658,9.1170015195,7.8334539572,8.6265801162,9.5168058139,7.8968149513,7.6230997651,7.4486224536,7.0854339828,11.783743413,11.409535707,12.831335472,9.7066712078,11.445165699,14.015659471,11.494252874,11.700571732,12.474199049,13.71667348,-3.236380233,-2.665001041,-3.714333952,-1.873217251,-2.818585583,-4.498853657,-3.597437922,-4.077471967,-5.025576595,-6.631239497,0.4979046513,0.4996876952,0.3376667229,0.255438716,0.4270584216,0,0.0877423883,0.0886406949,0.0897424392,0.0908388972,8.7963155056,-11.24297314,-10.46766841,-1.702924773,-0.170823369,-18.68754596,-1.316135825,-11.52329034,-4.307637082,-8.538856338,9.2942201568,-10.74328545,-10.13000169,-1.447486057,0.256235053,-18.68754596,-1.228393437,-11.43464965,-4.217894642,-8.448017441 +050,3,5,51,185,Virginia,Tazewell County,45078,45058,45118,44733,44276,44031,43399,42930,42226,41362,41152,40734,40529,60,-385,-457,-245,-632,-469,-704,-864,-210,-418,-205,118,445,422,456,435,472,450,381,421,358,370,162,683,632,637,584,574,519,529,599,558,629,-44,-238,-210,-181,-149,-102,-69,-148,-178,-200,-259,3,10,3,3,9,5,27,12,5,8,8,96,-156,-247,-57,-500,-372,-666,-731,-34,-225,47,99,-146,-244,-54,-491,-367,-639,-719,-29,-217,55,5,-1,-3,-10,8,0,4,3,-3,-1,-1,1645,1735,1780,1782,1802,1807,1853,1628,1536,1765,1764,1762,9.9052876429,9.4821871946,10.327607098,9.9508177971,10.934911791,10.568838367,9.1161410729,10.204328962,8.7438634199,9.10623531,15.202947101,14.200811154,14.426942371,13.359258836,13.297964763,12.189393584,12.657319232,14.518748334,13.628703319,15.480600027,-5.297659458,-4.718623959,-4.099335274,-3.408441039,-2.363052972,-1.620555216,-3.54117816,-4.314419371,-4.884839899,-6.374364717,0.2225907335,0.0674089137,0.0679447835,0.2058789889,0.11583593,0.634130302,0.2871225535,0.1211915554,0.195393596,0.1968915743,-3.472415443,-5.550000562,-1.290950887,-11.43772161,-8.618193191,-15.64188078,-17.49054888,-0.824102577,-5.495444887,1.1567379988,-3.24982471,-5.482591648,-1.223006104,-11.23184262,-8.502357261,-15.00775048,-17.20342633,-0.702911021,-5.300051291,1.3536295731 +050,3,5,51,187,Virginia,Warren County,37575,37452,37520,37654,37898,38514,40147,38742,39197,39478,40056,40235,40475,68,134,244,616,1633,-1405,455,281,578,179,240,101,453,447,472,505,490,466,491,484,503,508,111,335,357,368,332,363,366,371,411,403,438,-10,118,90,104,173,127,100,120,73,100,70,-1,-1,-1,11,17,20,34,35,13,31,21,78,17,159,489,1377,-1589,321,128,489,47,146,77,16,158,500,1394,-1569,355,163,502,78,167,1,0,-4,12,66,37,0,-2,3,1,3,725,725,745,740,760,1995,638,943,672,679,679,679,12.052039269,11.832909784,12.354080511,12.839907959,12.422517715,11.958069773,12.48172863,12.170895466,12.529424219,12.588279024,8.9126559715,9.4504447268,9.6319949746,8.4412860248,9.2028039397,9.3919603793,9.4312043216,10.335202555,10.038485011,10.853673646,3.1393832974,2.3824650572,2.7220855363,4.3986219346,3.2197137751,2.5661093932,3.0505243089,1.8356929112,2.4909392086,1.7346053773,-0.026604943,-0.026471834,0.2879128933,0.4322345254,0.5070415394,0.8724771937,0.8897362568,0.3269042171,0.7721911547,0.5203816132,0.4522840344,4.209021601,12.799036801,35.010996555,-40.2844503,8.2372111523,3.2538925961,12.296627857,1.1707414281,3.6178912155,0.4256790912,4.182549767,13.086949694,35.44323108,-39.77740876,9.109688346,4.1436288529,12.623532074,1.9429325827,4.1382728286 +050,3,5,51,191,Virginia,Washington County,54876,54959,54966,54839,55110,54800,54630,54309,54178,54202,54100,53852,53695,7,-127,271,-310,-170,-321,-131,24,-102,-248,-157,142,485,516,489,457,388,486,429,444,442,461,174,580,625,637,584,580,606,651,668,630,656,-32,-95,-109,-148,-127,-192,-120,-222,-224,-188,-195,2,17,8,18,27,15,11,10,-2,7,5,41,-47,365,-180,-56,-137,-20,237,129,-67,32,43,-30,373,-162,-29,-122,-9,247,127,-60,37,-4,-2,7,0,-14,-7,-2,-1,-5,0,1,1627,1615,1620,1896,1614,1630,1643,1490,1798,1783,1780,1782,8.8338418105,9.3861699515,8.8981894277,8.352371379,7.1232524624,8.9595988459,7.9165897767,8.1992945652,8.1888246628,8.5729959924,10.564181959,11.368907403,11.591301974,10.673489902,10.648160897,11.171845475,12.013286584,12.335875607,11.671854157,12.199317508,-1.730340148,-1.982737451,-2.693112547,-2.321118523,-3.524908435,-2.212246629,-4.096696808,-4.136581042,-3.483029495,-3.626321515,0.309639816,0.1455220148,0.3275407151,0.4934661427,0.2753834715,0.2027892743,0.1845358922,-0.036933759,0.1296872684,0.092982603,-0.856063021,6.6394419231,-3.275407151,-1.023485333,-2.51516904,-0.368707771,4.3735006459,2.382227475,-1.241292426,0.5950886589,-0.546423205,6.7849639378,-2.947866436,-0.53001919,-2.239785568,-0.165918497,4.5580365381,2.3452937157,-1.111605158,0.6880712619 +050,3,5,51,193,Virginia,Westmoreland County,17454,17464,17493,17639,17515,17553,17440,17553,17645,17723,17818,18029,18149,29,146,-124,38,-113,113,92,78,95,211,120,50,189,191,180,184,187,198,190,184,178,177,26,216,198,201,217,260,226,238,226,238,254,24,-27,-7,-21,-33,-73,-28,-48,-42,-60,-77,2,9,0,-3,-5,-4,-4,-6,-7,-7,-5,7,163,-113,61,-72,190,125,131,145,279,203,9,172,-113,58,-77,186,121,125,138,272,198,-4,1,-4,1,-3,0,-1,1,-1,-1,-1,70,70,70,70,70,70,70,70,70,70,70,70,10.75942161,10.866473232,10.265769362,10.516388992,10.687851856,11.250639241,10.744175526,10.354238766,9.9310960471,9.7849521809,12.29648184,11.264720942,11.463442455,12.402480496,14.86011488,12.841638729,13.458493553,12.717706311,13.278656512,14.041682791,-1.53706023,-0.39824771,-1.197673092,-1.886091504,-4.172263024,-1.590999489,-2.714318028,-2.363467545,-3.347560465,-4.25673061,0.51235341,0,-0.171096156,-0.28577144,-0.228617152,-0.227285641,-0.339289753,-0.393911257,-0.390548721,-0.276411079,9.2792895366,-6.428855891,3.4789551728,-4.115108736,10.85931472,7.1026762884,7.4078262836,8.1595903323,15.566156164,11.222289789,9.7916429466,-6.428855891,3.3078590168,-4.400880176,10.630697568,6.8753906472,7.0685365302,7.7656790749,15.175607443,10.945878711 +050,3,5,51,195,Virginia,Wise County,41452,41436,41574,41461,40928,40685,39916,39596,39059,38593,37877,37427,37206,138,-113,-533,-243,-769,-320,-537,-466,-716,-450,-221,133,446,414,469,434,372,391,382,340,355,358,88,484,490,540,510,527,471,486,530,425,478,45,-38,-76,-71,-76,-155,-80,-104,-190,-70,-120,3,2,4,9,11,16,17,15,6,12,9,83,-77,-471,-178,-721,-177,-477,-378,-534,-392,-111,86,-75,-467,-169,-710,-161,-460,-363,-528,-380,-102,7,0,10,-3,17,-4,3,1,2,0,1,3131,3223,3175,2938,3010,2927,3032,2966,3057,2909,2907,2909,10.742458,10.0498853,11.493267004,10.769097158,9.3570781769,9.9421524379,9.838767836,8.8923760952,9.4284500159,9.5936114051,11.65773469,11.89479178,13.23318589,12.65492984,13.255860751,11.976352425,12.517385257,13.86164509,11.287581005,12.809347072,-0.915276691,-1.84490648,-1.739918885,-1.885832682,-3.898782574,-2.034199987,-2.678617421,-4.969268994,-1.859130989,-3.215735667,0.0481724574,0.0971003411,0.2205530982,0.2729494671,0.4024549753,0.4322674973,0.3863390512,0.156924284,0.3187081696,0.241180175,-1.85463961,-11.43356516,-4.362050164,-17.89059689,-4.452158165,-12.12891742,-9.735744089,-13.96626128,-10.41113354,-2.974555492,-1.806467152,-11.33646482,-4.141497065,-17.61764742,-4.049703189,-11.69664993,-9.349405038,-13.80933699,-10.09242537,-2.733375317 +050,3,5,51,197,Virginia,Wythe County,29235,29246,29252,29204,29331,29285,29060,29106,28898,28832,28659,28618,28620,6,-48,127,-46,-225,46,-208,-66,-173,-41,2,63,256,307,267,264,311,256,310,299,257,265,50,333,342,372,380,400,410,396,414,386,406,13,-77,-35,-105,-116,-89,-154,-86,-115,-129,-141,0,3,4,1,5,-1,-3,-4,-5,-4,-2,-2,27,162,61,-111,139,-48,24,-53,93,145,-2,30,166,62,-106,138,-51,20,-58,89,143,-5,-1,-4,-3,-3,-3,-3,0,0,-1,0,260,260,260,260,260,260,260,260,260,260,260,260,8.7587245107,10.489450756,9.110140576,9.0496186477,10.693532304,8.8269774498,10.739650095,10.401628081,8.9739336907,9.2595827946,11.393184617,11.685316477,12.692780128,13.025966235,13.753739298,14.136956072,13.719036896,14.402254266,13.478359551,14.186379678,-2.634460107,-1.195865721,-3.582639552,-3.976347588,-3.060206994,-5.309978622,-2.979386801,-4.000626185,-4.50442586,-4.926796883,0.1026413029,0.1366703682,0.0341203767,0.1713942926,-0.034384348,-0.103441142,-0.13857613,-0.173940269,-0.13967212,-0.069883644,0.9237717257,5.5351499103,2.081342978,-3.804953295,4.779424406,-1.655058272,0.8314567816,-1.84376685,3.247376783,5.0665641707,1.0264130286,5.6718202785,2.1154633547,-3.633559002,4.7450400578,-1.758499414,0.6928806513,-2.017707119,3.1077046633,4.9966805269 +050,3,5,51,199,Virginia,York County,65464,65191,65224,65796,65872,66046,66607,67900,67914,68117,68136,68579,69199,33,572,76,174,561,1293,14,203,19,443,620,135,665,588,622,647,680,672,710,653,643,635,60,394,400,381,415,396,421,423,442,511,586,75,271,188,241,232,284,251,287,211,132,49,66,95,360,205,265,319,240,204,88,131,120,-116,209,-489,-283,62,695,-480,-288,-282,184,451,-50,304,-129,-78,327,1014,-240,-84,-194,315,571,8,-3,17,11,2,-5,3,0,2,-4,0,648,645,646,646,646,646,646,646,646,647,646,646,10.151121966,8.9315551235,9.430100517,9.754773733,10.110997941,9.895887022,10.438797039,9.5851100526,9.4064294335,9.2177270682,6.0143489544,6.0758878391,5.77631559,6.2569259647,5.888169389,6.1996554111,6.2191706302,6.487930541,7.4754050397,8.5064378928,4.1367730118,2.8556672844,3.653784927,3.4978477682,4.2228285517,3.6962316109,4.2196264087,3.0971795116,1.9310243938,0.7112891753,1.4501602809,5.4682990552,3.1079913279,3.9953864594,4.7432475633,3.534245365,2.9993163323,1.2917146778,1.9163954211,1.7419326743,3.1903526179,-7.427772883,-4.290544126,0.9347696622,10.33403466,-7.06849073,-4.23432894,-4.139358399,2.6917309732,6.5467636343,4.6405128988,-1.959473828,-1.182552798,4.9301561216,15.077282223,-3.534245365,-1.235012607,-2.847643722,4.6081263943,8.2886963086 +050,3,5,51,510,Virginia,Alexandria city,139966,139998,140737,144269,147379,149767,151544,153859,156621,158772,158377,159050,158726,739,3532,3110,2388,1777,2315,2762,2151,-395,673,-324,642,2687,2674,2855,2725,2747,2874,2812,2727,2628,2572,211,742,682,732,725,674,719,734,708,733,893,431,1945,1992,2123,2000,2073,2155,2078,2019,1895,1679,325,1518,2365,1746,2417,2496,1986,1846,1072,1480,1186,-30,51,-1233,-1470,-2644,-2254,-1376,-1756,-3474,-2683,-3172,295,1569,1132,276,-227,242,610,90,-2402,-1203,-1986,13,18,-14,-11,4,0,-3,-17,-12,-19,-17,1827,1829,1828,1849,1830,1832,1828,1832,1833,1834,1832,1830,18.855743388,18.337173579,19.216142906,18.087623751,17.989345226,18.513269776,17.831721059,17.196964203,16.558137777,16.187503147,5.2069079247,4.6768707483,4.9268709658,4.8123035667,4.4138400736,4.6315382633,4.6545104045,4.4647783849,4.6183846995,5.6203111626,13.648835463,13.660302831,14.28927194,13.275320184,13.575505152,13.881731512,13.177210655,12.732185818,11.939753077,10.567191984,10.652407318,16.218180821,11.751798779,16.043224443,16.345615465,12.793094563,11.706030254,6.760229419,9.3249786565,7.4643774231,0.3578872024,-8.455398288,-9.89412612,-17.54997328,-14.76082422,-8.863694924,-11.13531372,-21.90768377,-16.90467415,-19.96374805,11.01029452,7.7627825324,1.8576726592,-1.506748841,1.584791243,3.9293996393,0.5707165346,-15.14745435,-7.579695489,-12.49937063 +050,3,5,51,520,Virginia,Bristol city,17835,17738,17769,17726,17706,17411,17225,17185,17140,16956,16835,17036,17329,31,-43,-20,-295,-186,-40,-45,-184,-121,201,293,70,177,198,184,182,220,209,193,183,194,171,29,269,245,248,283,231,245,321,245,178,204,41,-92,-47,-64,-101,-11,-36,-128,-62,16,-33,0,17,1,4,4,1,-1,1,-3,0,-1,-8,32,30,-241,-86,-28,-7,-57,-57,185,328,-8,49,31,-237,-82,-27,-8,-56,-60,185,327,-2,0,-4,6,-3,-2,-1,0,1,0,-1,431,432,454,437,243,225,224,219,216,225,224,224,9.973235667,11.176337774,10.479255062,10.509296686,12.786980529,12.177713037,11.320976068,10.831286437,11.455227185,9.9519860323,15.157064375,13.829306841,14.124213344,16.341378912,13.426329555,14.275309541,18.829188175,14.500902607,10.510466181,11.87254474,-5.183828708,-2.652969068,-3.644958282,-5.832082227,-0.639349026,-2.097596504,-7.508212107,-3.66961617,0.944761005,-1.920558708,0.9578813917,0.0564461504,0.2278098926,0.2309735535,0.0581226388,-0.05826657,0.0586579071,-0.177562073,0,-0.058198749,1.8030708551,1.6933845112,-13.72554603,-4.965931401,-1.627433885,-0.407865987,-3.343500704,-3.373679382,10.92379912,19.089189582,2.7609522468,1.7498306615,-13.49773614,-4.734957847,-1.569311247,-0.466132556,-3.284842797,-3.551241455,10.92379912,19.030990834 +050,3,5,51,530,Virginia,Buena Vista city,6650,6608,6613,6715,6751,6661,6561,6541,6488,6504,6508,6481,6402,5,102,36,-90,-100,-20,-53,16,4,-27,-79,26,77,86,82,73,67,115,77,79,86,88,4,66,81,76,77,87,81,81,60,94,90,22,11,5,6,-4,-20,34,-4,19,-8,-2,0,0,4,6,5,0,4,3,2,3,3,-18,92,26,-104,-104,0,-91,17,-16,-22,-80,-18,92,30,-98,-99,0,-87,20,-14,-19,-77,1,-1,1,2,3,0,0,0,-1,0,0,400,400,468,560,464,435,468,426,432,490,490,489,11.554621849,12.77290955,12.227855652,11.04220239,10.227446191,17.652928084,11.853448276,12.142637565,13.241973978,13.661414267,9.9039615846,12.03029853,11.333134506,11.647254576,13.280415204,12.43380152,12.469211823,9.2222563787,14.473785511,13.971900955,1.6506602641,0.7426110203,0.8947211452,-0.605052186,-3.052969012,5.2191265638,-0.615763547,2.9203811866,-1.231811533,-0.310486688,0,0.5940888163,0.8947211452,0.7563152322,0,0.6140148899,0.4618226601,0.307408546,0.4619293248,0.4657300318,13.805522209,3.8615773058,-15.50849985,-15.73135683,0,-13.96883874,2.6169950739,-2.459268368,-3.387481715,-12.41946752,13.805522209,4.4556661221,-14.61377871,-14.9750416,0,-13.35482385,3.078817734,-2.151859822,-2.92555239,-11.95373748 +050,3,5,51,540,Virginia,Charlottesville city,43475,43425,43467,43780,44610,45052,45562,46357,46976,47456,47421,47283,46950,42,313,830,442,510,795,619,480,-35,-138,-333,125,485,542,506,532,464,501,537,549,525,546,50,256,247,259,297,291,272,315,272,300,347,75,229,295,247,235,173,229,222,277,225,199,71,358,444,372,440,418,363,342,177,273,211,-105,-275,86,-171,-157,201,26,-82,-490,-635,-742,-34,83,530,201,283,619,389,260,-313,-362,-531,1,1,5,-6,-8,3,1,-2,1,-1,-1,2398,2398,2398,2397,2414,2419,2419,2418,2422,2423,2424,2423,11.117860786,12.26383075,11.286832772,11.742114905,10.095845255,10.735752628,11.373263301,11.572878569,11.087176888,11.588297093,5.8683966211,5.588867519,5.7772523477,6.5552784338,6.3316615716,5.828592245,6.6714672992,5.7337394732,6.3355296503,7.3647236106,5.249464165,6.6749632311,5.5095804243,5.1868364712,3.7641836835,4.9071603827,4.7017960014,5.8391390959,4.7516472377,4.2235734828,8.2065858998,10.046385338,8.2978296268,9.7115236056,9.0949640444,7.7785992093,7.2433073534,3.7311466425,5.7653319818,4.478261331,-6.303941683,1.9459214843,-3.814324909,-3.465248196,4.3734157247,0.5571448469,-1.736699424,-10.32916302,-13.41020443,-15.74819861,1.902644217,11.992306822,4.4835047177,6.24627541,13.468379769,8.3357440562,5.5066079295,-6.598016379,-7.644872445,-11.26993728 +050,3,5,51,550,Virginia,Chesapeake city,222209,222268,223525,225360,228134,230415,233477,235253,237656,240416,242748,245403,247011,1257,1835,2774,2281,3062,1776,2403,2760,2332,2655,1608,720,2766,2769,2805,2881,2995,2936,2852,2939,2992,2930,414,1561,1547,1693,1630,1755,1781,1787,1816,1996,2153,306,1205,1222,1112,1251,1240,1155,1065,1123,996,777,95,172,589,412,525,595,510,444,244,284,272,788,463,982,793,1315,-41,751,1271,977,1383,549,883,635,1571,1205,1840,554,1261,1715,1221,1667,821,68,-5,-19,-36,-29,-18,-13,-20,-12,-8,10,3721,4206,4238,4518,4389,4394,4127,4164,4291,4308,4316,4313,12.323869142,12.211848448,12.234243232,12.420994542,12.779211913,12.41676517,11.931257216,12.16564148,12.25850198,11.900555224,6.9550107489,6.8225819967,7.3841617799,7.0274977797,7.4883195016,7.5321044852,7.4758613765,7.5171163414,8.1777974438,8.7446741969,5.3688583936,5.3892664512,4.8500814526,5.3934967622,5.2908924114,4.8846606852,4.45539584,4.6485251385,4.0807045361,3.1558810269,0.7663432728,2.5976087886,1.7969726245,2.2634578738,2.5387749877,2.1568631597,1.8574608009,1.0100090239,1.1635743858,1.1047614406,2.0628891587,4.3308180483,3.4587361438,5.6694230554,-0.174940797,3.1760867313,5.317190716,4.0441754766,5.6662794914,2.2298309959,2.8292324315,6.928426837,5.2557087683,7.9328809292,2.3638341903,5.332949891,7.1746515169,5.0541845005,6.8298538772,3.3345924364 +050,3,5,51,570,Virginia,Colonial Heights city,17411,17409,17338,17288,17390,17492,17448,17457,17400,17382,17337,17089,17205,-71,-50,102,102,-44,9,-57,-18,-45,-248,116,40,178,189,214,223,195,203,196,192,213,236,60,218,220,201,234,256,287,259,256,247,217,-20,-40,-31,13,-11,-61,-84,-63,-64,-34,19,2,47,58,37,44,61,24,23,10,8,9,-56,-57,76,55,-75,10,5,22,12,-222,88,-54,-10,134,92,-31,71,29,45,22,-214,97,3,0,-1,-3,-2,-1,-2,0,-3,0,0,171,171,171,171,171,171,171,171,171,171,171,171,10.281291515,10.9002826,12.26993865,12.764739554,11.173184358,11.64758872,11.270197228,11.060226389,12.37436821,13.763340526,12.591694103,12.68815964,11.524568545,13.394390384,14.668385618,16.467280604,14.892760623,14.746968519,14.349619474,12.655274975,-2.310402588,-1.78787704,0.7453701049,-0.62965083,-3.495201261,-4.819691884,-3.622563395,-3.68674213,-1.975251264,1.1080655508,2.7147230405,3.3450602688,2.1214379909,2.51860332,3.4952012606,1.377054824,1.3225231442,0.5760534578,0.4647650032,0.5248731557,-3.292323687,4.3831824211,3.1534889055,-4.293073841,0.5729838132,0.2868864217,1.2650221379,0.6912641493,-12.89722884,5.1320930775,-0.577600647,7.7282426899,5.2749268964,-1.774470521,4.0681850738,1.6639412457,2.587545282,1.2673176071,-12.43246384,5.6569662332 +050,3,5,51,580,Virginia,Covington city,5961,5951,5941,5916,5846,5832,5778,5671,5682,5660,5660,5622,5639,-10,-25,-70,-14,-54,-107,11,-22,0,-38,17,16,59,71,62,62,30,128,71,59,78,81,27,69,59,87,71,128,118,115,117,94,70,-11,-10,12,-25,-9,-98,10,-44,-58,-16,11,0,3,0,2,6,14,13,12,8,9,9,2,-18,-81,9,-52,-21,-12,11,51,-31,-4,2,-15,-81,11,-46,-7,1,23,59,-22,5,-1,0,-1,0,1,-2,0,-1,-1,0,1,87,78,87,78,76,75,87,87,88,87,87,87,9.9519271317,12.072776739,10.618256551,10.68044789,5.2406323696,22.549105963,12.519837771,10.424028269,13.827335579,14.385933754,11.638694442,10.032307431,14.899811612,12.230835487,22.360031444,20.78745706,20.278610474,20.671378092,16.663712108,12.432288429,-1.68676731,2.0404693079,-4.281555061,-1.550387597,-17.11939907,1.7616489034,-7.758772703,-10.24734982,-2.836376529,1.9536453246,0.5060301931,0,0.3425244049,1.0335917313,2.4456284392,2.2901435744,2.1160289191,1.4134275618,1.5954617976,1.5984370837,-3.036181159,-13.77316783,1.5413598219,-8.957795004,-3.668442659,-2.113978684,1.9396931758,9.0106007067,-5.495479525,-0.710416482,-2.530150966,-13.77316783,1.8838842268,-7.924203273,-1.22281422,0.1761648903,4.0557220949,10.424028269,-3.900017727,0.8880206021 +050,3,5,51,590,Virginia,Danville city,43055,43071,42925,42657,42725,42648,42295,41984,41682,41078,40677,40036,39869,-146,-268,68,-77,-353,-311,-302,-604,-401,-641,-167,121,515,536,555,540,520,486,497,464,487,461,173,684,704,688,643,684,687,726,705,696,710,-52,-169,-168,-133,-103,-164,-201,-229,-241,-209,-249,2,20,49,39,72,74,51,50,31,33,34,-97,-116,194,25,-323,-217,-149,-425,-190,-463,49,-95,-96,243,64,-251,-143,-98,-375,-159,-430,83,1,-3,-7,-8,1,-4,-3,0,-1,-2,-1,1483,1483,1552,1581,1585,1630,1576,1582,1525,1579,1578,1578,12.035241055,12.555339533,13.001768709,12.714408486,12.339966065,11.617622451,12.010633156,11.350987707,12.067448862,11.538702209,15.984669674,16.490595207,16.117507877,15.139564178,16.231801516,16.422441613,17.544707588,17.246651581,17.246292419,17.771103185,-3.949428618,-3.935255674,-3.115739168,-2.425155693,-3.891835451,-4.804819162,-5.534074432,-5.895663874,-5.178843557,-6.232400976,0.4673880021,1.1477829051,0.9136378012,1.6952544648,1.7560720939,1.2191332202,1.2083131948,0.7583634028,0.8177121405,0.8510105751,-2.710850412,4.5442833384,0.5856652572,-7.605099891,-5.149562762,-3.561781369,-10.27066216,-4.648033759,-11.47274912,1.226456417,-2.24346241,5.6920662435,1.4993030583,-5.909845426,-3.393490668,-2.342648149,-9.062348961,-3.889670357,-10.65503698,2.0774669921 +050,3,5,51,595,Virginia,Emporia city,5927,5925,5920,5841,5816,5697,5606,5569,5487,5489,5396,5409,5257,-5,-79,-25,-119,-91,-37,-82,2,-93,13,-152,20,80,62,65,74,75,84,87,92,75,74,35,102,88,106,90,33,40,65,67,60,87,-15,-22,-26,-41,-16,42,44,22,25,15,-13,1,5,2,5,0,-2,-3,-2,-3,-3,-1,10,-62,-2,-84,-76,-77,-123,-18,-114,0,-137,11,-57,0,-79,-76,-79,-126,-20,-117,-3,-138,-1,0,1,1,1,0,0,0,-1,1,-1,246,246,246,246,246,246,246,246,246,246,246,246,13.60428535,10.637385262,11.291583427,13.093868884,13.422818792,15.19536903,15.852769679,16.903996325,13.882461823,13.875867242,17.345463821,15.098224243,18.41396682,15.92497567,5.9060402685,7.2358900145,11.844023324,12.310519063,11.105969459,16.313519595,-3.741178471,-4.460838981,-7.122383393,-2.831106786,7.5167785235,7.9594790159,4.0087463557,4.5934772623,2.7764923646,-2.437652353,0.8502678344,0.3431414601,0.8685833406,0,-0.357941834,-0.542691751,-0.364431487,-0.551217271,-0.555298473,-0.187511719,-10.54332115,-0.34314146,-14.59220012,-13.44775723,-13.78076063,-22.25036179,-3.279883382,-20.94625632,0,-25.68910557,-9.693053312,0,-13.72361678,-13.44775723,-14.13870246,-22.79305355,-3.644314869,-21.49747359,-0.555298473,-25.87661729 +050,3,5,51,600,Virginia,Fairfax city,22565,22554,22616,22467,22904,23241,23324,23247,23305,23274,23256,23294,23429,62,-149,437,337,83,-77,58,-31,-18,38,135,78,218,338,268,273,238,326,318,268,307,514,34,186,188,171,159,226,246,229,229,248,256,44,32,150,97,114,12,80,89,39,59,258,26,144,231,208,294,277,284,268,155,225,176,-7,-327,54,34,-334,-371,-308,-390,-211,-246,-299,19,-183,285,242,-40,-94,-24,-122,-56,-21,-123,-1,2,2,-2,9,5,2,2,-1,0,0,521,521,521,521,521,521,521,521,521,521,521,521,9.6710511723,14.89938507,11.615559649,11.725544937,10.220952954,14.005842928,13.65422186,11.519449817,13.190118153,22.002011857,8.2514473305,8.2872319323,7.4114205223,6.8291635348,9.7056107878,10.568826259,9.8327572511,9.8431119708,10.655209452,10.958200458,1.4196038418,6.6121531375,4.2041391267,4.8963814023,0.5153421657,3.4370166695,3.8214646085,1.6763378466,2.5349087003,11.043811399,6.3882172881,10.182715832,9.0150612201,12.627509932,11.895814992,12.201409177,11.50733163,6.6623683645,9.6670247046,7.5337628149,-14.50657676,2.3803751295,1.4736157764,-14.34553849,-15.93266196,-13.23251418,-16.74574379,-9.06941758,-10.56928034,-12.79883569,-8.11835947,12.563090961,10.488676996,-1.718028562,-4.036846965,-1.031105001,-5.23841216,-2.407049216,-0.902255639,-5.265072876 +050,3,5,51,610,Virginia,Falls Church city,12332,12267,12422,12691,13126,13403,13459,13777,13649,14273,14441,14551,14631,155,269,435,277,56,318,-128,624,168,110,80,27,135,152,145,179,140,143,147,117,158,179,13,60,70,70,75,70,78,88,78,105,110,14,75,82,75,104,70,65,59,39,53,69,16,70,106,59,79,53,63,56,27,41,37,115,125,240,145,-135,192,-259,507,102,16,-26,131,195,346,204,-56,245,-196,563,129,57,11,10,-1,7,-2,8,3,3,2,0,0,0,42,42,42,42,42,42,42,42,42,42,42,42,10.751403655,11.775186892,10.931433526,13.327376964,10.280511088,10.428060964,10.52933171,8.1493348193,10.899558499,12.267836337,4.7784016247,5.4227834373,5.277243771,5.5840964932,5.1402555441,5.6880332531,6.3032734045,5.4328898795,7.2433774834,7.5388938387,5.9730020308,6.3524034551,5.6541897546,7.7432804706,5.1402555441,4.7400277109,4.2260583053,2.7164449398,3.6561810155,4.7289424988,5.5748018954,8.2116434907,4.447962607,5.8819149728,3.8919077691,4.5941807044,4.0111739847,1.8806157275,2.8283664459,2.5358097457,9.9550033847,18.592400356,10.931433526,-10.05137369,14.098986635,-18.88718734,36.315450183,7.104548304,1.1037527594,-1.781920362,15.52980528,26.804043847,15.379396133,-4.169458715,17.990894404,-14.29300664,40.326624167,8.9851640315,3.9321192053,0.7538893839 +050,3,5,51,620,Virginia,Franklin city,8582,8578,8579,8448,8488,8545,8399,8339,8210,8132,8033,7867,7833,1,-131,40,57,-146,-60,-129,-78,-99,-166,-34,30,97,126,129,118,107,95,98,126,112,128,48,135,117,136,130,145,139,147,150,123,109,-18,-38,9,-7,-12,-38,-44,-49,-24,-11,19,1,6,13,5,7,-1,0,0,0,0,0,18,-100,20,60,-144,-20,-84,-30,-75,-154,-54,19,-94,33,65,-137,-21,-84,-30,-75,-154,-54,0,1,-2,-1,3,-1,-1,1,0,-1,1,129,129,129,129,129,129,129,129,129,129,129,129,11.393668879,14.879546528,15.147067457,13.928234183,12.785279006,11.481056257,11.99363603,15.589236004,14.088050314,16.305732484,15.857168027,13.816721776,15.96900135,15.344664778,17.325845382,16.798598103,17.990454045,18.55861429,15.471698113,13.885350318,-4.463499148,1.062824752,-0.821933893,-1.416430595,-4.540566376,-5.317541845,-5.996818015,-2.969378286,-1.383647799,2.4203821656,0.7047630234,1.5351913085,0.5870956379,0.8262511804,-0.119488589,0,0,0,0,0,-11.74605039,2.3618327822,7.0451476546,-16.99716714,-2.389771777,-10.1516708,-3.671521234,-9.279307145,-19.37106918,-6.878980892,-11.04128737,3.8970240907,7.6322432924,-16.17091596,-2.509260366,-10.1516708,-3.671521234,-9.279307145,-19.37106918,-6.878980892 +050,3,5,51,630,Virginia,Fredericksburg city,24286,24178,24356,25759,27190,27835,28276,28075,28469,28718,29362,29254,29492,178,1403,1431,645,441,-201,394,249,644,-108,238,101,399,420,405,433,422,407,418,404,397,383,17,184,159,195,171,198,202,216,195,189,258,84,215,261,210,262,224,205,202,209,208,125,26,121,104,71,121,125,182,206,138,136,118,65,1057,1014,348,56,-556,7,-158,294,-451,-7,91,1178,1118,419,177,-431,189,48,432,-315,111,3,10,52,16,2,6,0,-1,3,-1,2,2596,2596,2691,2798,2855,2787,2581,2600,2651,2676,2677,2676,15.923376235,15.864322272,14.720581554,15.433693928,14.977551419,14.395868704,14.618707049,13.91184573,13.545789546,13.039185647,7.3431108451,6.005779146,7.0876874148,6.0950615744,7.0273819453,7.1448783248,7.554164408,6.7148760331,6.4487511942,8.7835767542,8.5802653896,9.8585431264,7.632894139,9.3386323537,7.9501694735,7.2509903792,7.0645426408,7.196969697,7.0970383513,4.2556088925,4.8288935448,3.9283083722,2.5806451613,4.3128798275,4.4364785008,6.4374646293,7.2044345743,4.7520661157,4.6403712297,4.0172947945,42.182979148,38.301006629,12.648796002,1.9960435565,-19.73345637,0.2475947934,-5.525731373,10.123966942,-15.38828989,-0.238314098,47.011872693,42.229315001,15.229441163,6.308923384,-15.29697787,6.6850594228,1.6787032018,14.876033058,-10.74791866,3.7789806966 +050,3,5,51,640,Virginia,Galax city,7042,6989,6989,6844,6850,6927,6892,6791,6615,6477,6300,6324,6296,0,-145,6,77,-35,-101,-176,-138,-177,24,-28,23,106,107,94,95,96,100,70,70,93,88,35,106,115,95,97,174,190,169,191,113,93,-12,0,-8,-1,-2,-78,-90,-99,-121,-20,-5,-2,2,-6,8,1,-5,1,0,-4,-2,-2,12,-147,21,70,-32,-19,-86,-39,-51,46,-20,10,-145,15,78,-31,-24,-85,-39,-55,44,-22,2,0,-1,0,-2,1,-1,0,-1,0,-1,377,377,377,377,377,377,377,377,377,377,377,377,15.325670498,15.627282021,13.645931625,13.749185903,14.032010524,14.918693122,10.693553315,10.957188698,14.733840304,13.946117274,15.325670498,16.795676939,13.791101111,14.038642449,25.433019075,28.345516933,25.817293003,29.89747202,17.902408112,14.738510301,0,-1.168394917,-0.145169485,-0.289456545,-11.40100855,-13.42682381,-15.12373969,-18.94028332,-3.168567807,-0.792393027,0.2891635943,-0.876296188,1.161355883,0.1447282727,-0.730833881,0.1491869312,0,-0.626125068,-0.316856781,-0.316957211,-21.25352418,3.0670366584,10.161863976,-4.631304725,-2.77716875,-12.83007609,-5.957836847,-7.983094623,7.2877059569,-3.169572108,-20.96436059,2.1907404703,11.323219859,-4.486576453,-3.508002631,-12.68088915,-5.957836847,-8.609219692,6.9708491762,-3.486529319 +050,3,5,51,650,Virginia,Hampton city,137436,137463,137418,136652,137222,137406,137778,136379,135525,135007,134800,135048,135464,-45,-766,570,184,372,-1399,-854,-518,-207,248,416,480,1827,1867,1899,1861,1763,1724,1831,1782,1732,1665,208,1163,1110,1178,1270,1297,1256,1301,1284,1386,1429,272,664,757,721,591,466,468,530,498,346,236,68,114,492,339,324,377,336,263,119,181,164,-402,-1553,-671,-866,-517,-2261,-1659,-1308,-820,-280,7,-334,-1439,-179,-527,-193,-1884,-1323,-1045,-701,-99,171,17,9,-8,-10,-26,19,1,-3,-4,1,9,4454,4455,4367,4269,4108,4639,4718,4782,5088,4959,4916,4915,13.332360346,13.634006879,13.829616791,13.525495668,12.86124374,12.680946216,13.536291455,13.209442305,12.836856304,12.309989945,8.4868829131,8.1059173196,8.578877609,9.2301878016,9.4617317814,9.238554784,9.6180858457,9.5179146575,10.272449675,10.565150529,4.8454774328,5.5280895594,5.2507391817,4.2953078667,3.3995119585,3.4423914323,3.9182056097,3.6915276475,2.5644066289,1.7448394156,0.831904258,3.5928930822,2.4687941506,2.3547880691,2.7502489449,2.4714605155,1.9443171233,0.8821120282,1.3414959533,1.2125155261,-11.33287116,-4.900063533,-6.306713081,-3.7574859,-16.49419858,-12.2028363,-9.669835731,-6.078419018,-2.075242359,0.0517537115,-10.50096691,-1.307170451,-3.83791893,-1.402697831,-13.74394963,-9.73137578,-7.725518608,-5.19630699,-0.733746405,1.2642692376 +050,3,5,51,660,Virginia,Harrisonburg city,48914,48902,48999,49950,51336,51572,52589,52739,53685,53807,53715,53379,53204,97,951,1386,236,1017,150,946,122,-92,-336,-175,127,529,489,556,565,553,629,558,584,547,605,46,271,258,241,208,313,341,285,316,307,303,81,258,231,315,357,240,288,273,268,240,302,59,318,353,384,472,474,560,554,360,410,343,-40,369,773,-472,189,-568,98,-709,-723,-990,-819,19,687,1126,-88,661,-94,658,-155,-363,-580,-476,-3,6,29,9,-1,4,0,4,3,4,-1,7585,7587,7549,7619,7589,7389,7523,7628,7666,7686,7686,7690,10.692376881,9.6558260767,10.805768259,10.848590163,10.500531672,11.82064196,10.382167975,10.862893175,10.215324855,11.352654739,5.4775692528,5.0944849239,4.6837952346,3.9938172637,5.9433389032,6.4083289484,5.3027202024,5.8778668552,5.7332810428,5.6857097286,5.2148076282,4.5613411528,6.1219730244,6.8547728996,4.5571927693,5.4123130121,5.0794477729,4.9850263202,4.482043812,5.66694501,6.4275535882,6.9703611555,7.4629766393,9.0628930214,9.0004557193,10.523941968,10.307743832,6.6963040122,7.6568248455,6.4362984716,7.4583876542,15.263708706,-9.173242119,3.6289974175,-10.78535622,1.8416898444,-13.19167938,-13.44841056,-18.48843072,-15.36830451,13.885941242,22.234069862,-1.71026548,12.691890439,-1.784900501,12.365631812,-2.883935549,-6.752106546,-10.83160588,-8.932006042 +050,3,5,51,670,Virginia,Hopewell city,22591,22591,22640,22500,22306,22161,22117,22241,22565,22533,22506,22523,22375,49,-140,-194,-145,-44,124,324,-32,-27,17,-148,85,334,332,362,354,315,341,330,300,336,333,38,293,268,276,305,307,324,309,309,330,322,47,41,64,86,49,8,17,21,-9,6,11,5,30,29,37,53,67,59,83,82,35,44,0,-212,-293,-273,-147,53,248,-135,-99,-24,-201,5,-182,-264,-236,-94,120,307,-52,-17,11,-157,-3,1,6,5,1,-4,0,-1,-1,0,-2,237,237,237,237,237,237,237,237,237,237,237,237,14.798404962,14.819443824,16.281737018,15.989882108,14.202624104,15.221175735,14.634795335,13.321787784,14.923715828,14.833622879,12.981834293,11.962683569,12.413700047,13.776593342,13.841922539,14.462348793,13.703490177,13.721441417,14.657220902,14.343623324,1.816570669,2.8567602553,3.8680369712,2.2132887664,0.3607015645,0.7588269428,0.9313051577,-0.399653634,0.2664949255,0.4899995545,1.3291980505,1.2944694907,1.6641554411,2.3939654004,3.020875603,2.6335758604,3.680872766,3.6412886609,1.554553732,1.9599982182,-9.392999557,-13.07860554,-12.27876852,-6.639866299,2.3896478651,11.069945989,-5.986961728,-4.396189969,-1.065979702,-8.953628224,-8.063801506,-11.78413605,-10.61461308,-4.245900899,5.4105234681,13.70352185,-2.306088962,-0.754901308,0.4885740301,-6.993630006 +050,3,5,51,678,Virginia,Lexington city,7042,7037,7045,6977,7027,7155,7135,7174,7158,7139,7201,7246,7279,8,-68,50,128,-20,39,-16,-19,62,45,33,9,41,40,36,35,60,19,25,46,42,78,4,65,58,65,69,88,71,100,85,73,66,5,-24,-18,-29,-34,-28,-52,-75,-39,-31,12,4,13,13,9,13,12,13,8,-2,1,4,-1,-58,53,143,3,55,22,48,103,77,15,3,-45,66,152,16,67,35,56,101,78,19,0,1,2,5,-2,0,1,0,0,-2,2,2567,2560,2612,2650,2723,2710,2724,2704,2736,2753,2748,2753,5.8479532164,5.7126535276,5.076857989,4.8985304409,8.3863302816,2.6514094334,3.4972371826,6.4156206416,5.8143559216,10.74010327,9.271145343,8.283347615,9.1665491468,9.6571028691,12.29995108,9.9078984092,13.988948731,11.854951185,10.10590434,9.0877796902,-3.423192127,-2.570694087,-4.089691158,-4.758572428,-3.913620798,-7.256488976,-10.49171155,-5.439330544,-4.291548418,1.65232358,1.8542290686,1.8566123965,1.2692144973,1.8194541638,1.6772660563,1.8141222439,1.1191158984,-0.278940028,0.1384370458,0.5507745267,-8.272714306,7.569265924,20.166408123,0.4198740378,7.6874694248,3.0700530282,6.7146953906,14.365411437,10.659652523,2.065404475,-6.418485237,9.4258783205,21.43562262,2.2393282015,9.3647354812,4.8841752721,7.8338112891,14.086471409,10.798089569,2.6161790017 +050,3,5,51,680,Virginia,Lynchburg city,75568,75535,75553,76614,77326,78015,78242,79263,79871,80567,81096,81753,81561,18,1061,712,689,227,1021,608,696,529,657,-192,237,953,996,1004,1030,1051,1039,972,964,999,1067,219,793,779,770,817,895,728,811,830,851,857,18,160,217,234,213,156,311,161,134,148,210,43,222,241,265,427,409,404,373,221,315,249,-33,674,250,195,-399,448,-103,163,174,191,-651,10,896,491,460,28,857,301,536,395,506,-402,-10,5,4,-5,-14,8,-4,-1,0,3,0,10198,10199,10265,10292,10299,10298,10778,10804,11061,11036,11044,11044,12.525711882,12.940106535,12.926400628,13.183409383,13.345608076,13.058177385,12.116830177,11.926043683,12.269034504,13.066852811,10.422759205,10.120826296,9.9136737886,10.457131521,11.36471858,9.1495217867,10.109824356,10.268274126,10.451399763,10.495119831,2.102952677,2.8192802391,3.0127268397,2.7262778628,1.9808894956,3.9086555984,2.0070058216,1.6577695577,1.8176347414,2.5717329806,2.9178468393,3.1310900351,3.4118487714,5.4653551521,5.1934859211,5.0774818706,4.6497712512,2.7340826287,3.8686144834,3.0493405342,8.8586881518,3.2480187086,2.5106056997,-5.106971208,5.688708295,-1.294506517,2.0319375709,2.152626142,2.3457313217,-7.97237224,11.776534991,6.3791087437,5.9224544711,0.3583839444,10.882194216,3.7829753541,6.6817088221,4.8867087707,6.214345805,-4.923031706 +050,3,5,51,683,Virginia,Manassas city,37821,37799,38212,39103,40284,41079,41137,41409,41245,41171,40998,40907,40869,413,891,1181,795,58,272,-164,-74,-173,-91,-38,148,596,666,669,697,726,733,709,697,646,678,26,186,186,191,220,216,235,248,270,242,234,122,410,480,478,477,510,498,461,427,404,444,68,231,277,204,276,248,272,236,143,196,155,206,247,414,115,-705,-489,-938,-775,-747,-689,-634,274,478,691,319,-429,-241,-666,-539,-604,-493,-479,17,3,10,-2,10,3,4,4,4,-2,-3,46,46,46,46,46,46,46,46,46,46,46,46,15.417448102,16.77856576,16.444821356,16.955337161,17.590192135,17.736588671,17.20539701,16.965035476,15.774372749,16.581882215,4.8114854815,4.6859057528,4.6950087878,5.3517563491,5.233445594,5.6863551673,6.0182488837,6.5718214899,5.9092851474,5.7229504989,10.60596262,12.092660007,11.749812568,11.603580812,12.356746541,12.050233504,11.187148127,10.393213986,9.8650876015,10.858931716,5.9755545496,6.9784725459,5.0145643597,6.7140216016,6.0087708672,6.5816536405,5.7270432926,3.4806313817,4.7860325987,3.7908432792,6.3894457738,10.429919256,2.8268377518,-17.14994648,-11.84793933,-22.69702616,-18.80702776,-18.18203946,-16.8243697,-15.50577186,12.365000323,17.408391802,7.8414021115,-10.43592488,-5.839168464,-16.11537252,-13.07998447,-14.70140807,-12.0383371,-11.71492859 +050,3,5,51,685,Virginia,Manassas Park city,14273,14243,14451,15071,15404,15903,15926,16145,16420,17209,18038,18071,18004,208,620,333,499,23,219,275,789,829,33,-67,36,297,239,278,236,234,234,288,304,281,175,1,53,26,28,52,17,40,30,31,29,59,35,244,213,250,184,217,194,258,273,252,116,14,68,93,111,173,179,164,150,74,118,92,143,306,27,132,-345,-178,-81,377,477,-334,-276,157,374,120,243,-172,1,83,527,551,-216,-184,16,2,0,6,11,1,-2,4,5,-3,1,6,6,6,6,6,6,6,6,6,6,6,6,20.120588036,15.684987695,17.759606478,14.829243771,14.592622619,14.371257485,17.128073984,17.24969501,15.563986818,9.702009702,3.5905426462,1.706316653,1.7887373431,3.267460492,1.0601477971,2.4566252111,1.7841743733,1.7590149516,1.6062477499,3.270963271,16.53004539,13.978671042,15.970869135,11.561783279,13.532474821,11.914632274,15.34389961,15.490680058,13.957739068,6.431046431,4.6067339611,6.1033634126,7.0910658958,10.870589714,11.162732687,10.072163366,8.9208718665,4.1989389168,6.5357667064,5.1004851005,20.730302825,1.7719442166,8.4326189031,-21.67834365,-11.10037105,-4.974666053,22.421124625,27.066133288,-18.49954305,-15.3014553,25.337036786,7.8753076292,15.523684799,-10.80775394,0.0623616351,5.0974973131,31.341996491,31.265072205,-11.96377634,-10.2009702 +050,3,5,51,690,Virginia,Martinsville city,13821,13840,13786,13622,13518,13443,13343,13289,13027,12827,12576,12443,12355,-54,-164,-104,-75,-100,-54,-262,-200,-251,-133,-88,37,203,185,159,171,194,201,155,142,155,190,27,234,257,229,201,290,321,342,321,294,245,10,-31,-72,-70,-30,-96,-120,-187,-179,-139,-55,-1,3,15,3,0,18,20,24,16,20,13,-69,-135,-45,-7,-69,26,-162,-36,-88,-14,-46,-70,-132,-30,-4,-69,44,-142,-12,-72,6,-33,6,-1,-2,-1,-1,-2,0,-1,0,0,0,377,365,361,377,377,377,377,377,377,377,377,377,14.813193228,13.633014001,11.794814732,12.767863809,14.568939622,15.275877793,11.990407674,11.179781916,12.390583157,15.323816437,17.07530648,18.938835667,16.987500464,15.007839916,21.778311805,24.395804834,26.456254351,25.272605598,23.502138375,19.759658037,-2.262113252,-5.305821665,-5.192685731,-2.239976107,-7.209372184,-9.119927041,-14.46584668,-14.09282368,-11.11155522,-4.4358416,0.2189141856,1.1053795136,0.2225436742,0,1.3517572845,1.5199878401,1.8565792527,1.259693737,1.5987849235,1.0484716509,-9.851138354,-3.316138541,-0.519268573,-5.151945046,1.9525382998,-12.3119015,-2.784868879,-6.928315553,-1.119149446,-3.709976611,-9.632224168,-2.210759027,-0.296724899,-5.151945046,3.3042955843,-10.79191366,-0.928289626,-5.668621816,0.479635477,-2.66150496 +050,3,5,51,700,Virginia,Newport News city,180719,180956,180905,180139,180148,181388,181661,181121,180472,179738,178904,179736,179062,-51,-766,9,1240,273,-540,-649,-734,-834,832,-674,705,2878,2900,2905,2744,2802,2805,2670,2678,2608,2674,274,1417,1399,1481,1414,1578,1562,1619,1544,1643,1721,431,1461,1501,1424,1330,1224,1243,1051,1134,965,953,201,468,977,561,565,744,659,588,277,413,356,-710,-2711,-2525,-723,-1615,-2522,-2556,-2377,-2247,-550,-1977,-509,-2243,-1548,-162,-1050,-1778,-1897,-1789,-1970,-137,-1621,27,16,56,-22,-7,14,5,4,2,4,-6,7499,7513,7793,7483,8120,8183,8138,7526,7925,7965,7957,7958,15.942655189,16.098277207,16.070322181,15.116416792,15.447293416,15.51468087,14.8246856,14.934112569,14.543832255,14.905322772,7.8494587917,7.7660309698,8.1928217384,7.7895821225,8.6994393327,8.6395477789,8.989200744,8.6102575828,9.1623912559,9.5931415448,8.0931963971,8.332246237,7.8775004426,7.3268346697,6.7478540832,6.8751330916,5.8354848561,6.3238549863,5.3814409993,5.3121812273,2.5924818028,5.4234540797,3.103425385,3.1125275101,4.1016367957,3.6449820655,3.264762222,1.5447159005,2.3031452153,1.9844034805,-15.01756019,-14.01660343,-3.999601699,-8.89687067,-13.90366666,-14.13744182,-13.19785681,-12.53060155,-3.067142538,-11.02012832,-12.42507838,-8.59314935,-0.896176314,-5.78434316,-9.802029869,-10.49245975,-9.933094584,-10.98588565,-0.763997323,-9.035724837 +050,3,5,51,710,Virginia,Norfolk city,242803,242840,243019,243701,246247,245598,246756,246667,246042,244908,244168,243581,242803,179,682,2546,-649,1158,-89,-625,-1134,-740,-587,-778,893,3699,3860,3656,3750,3669,3714,3377,3478,3386,3358,458,1833,1834,1914,1950,1965,1964,2058,2053,2088,2266,435,1866,2026,1742,1800,1704,1750,1319,1425,1298,1092,322,532,1925,1024,1224,1493,1114,767,165,533,468,-573,-1718,-1362,-3447,-1824,-3291,-3495,-3210,-2308,-2409,-2337,-251,-1186,563,-2423,-600,-1798,-2381,-2443,-2143,-1876,-1869,-5,2,-43,32,-42,5,6,-10,-22,-9,-1,32780,32891,33336,33622,33045,34100,33683,33392,33607,34142,34011,34025,15.199704142,15.756774188,14.866472161,15.232942151,14.871621307,15.075835838,13.757001731,14.222738388,13.884190434,13.808020001,7.5320512821,7.4865087724,7.7829397473,7.9211299187,7.9647685657,7.9722513695,8.383745799,8.3954232062,8.561780752,9.3177407152,7.66765286,8.2702654159,7.0835324137,7.3118122327,6.906852741,7.1035844687,5.3732559324,5.8273151821,5.322409682,4.4902792855,2.1860618014,7.8579767649,4.163913428,4.9720323182,6.051602783,4.5219389132,3.1245544353,0.6747417579,2.1855503548,1.9244054081,-7.059500329,-5.55977369,-14.01661092,-7.409303062,-13.33946735,-14.18687298,-13.07668805,-9.438205923,-9.878031529,-9.609691108,-4.873438527,2.2982030746,-9.852697496,-2.437270744,-7.287864571,-9.664934069,-9.952133618,-8.763464165,-7.692481174,-7.6852857 +050,3,5,51,720,Virginia,Norton city,3958,3994,4013,4087,4125,4103,4139,4013,3992,3927,3956,3983,3985,19,74,38,-22,36,-126,-21,-65,29,27,2,16,51,47,58,56,38,68,42,32,54,43,12,40,45,42,32,50,49,46,61,41,31,4,11,2,16,24,-12,19,-4,-29,13,12,2,12,8,17,12,3,7,5,1,3,2,12,52,26,-55,-2,-118,-48,-67,56,13,-12,14,64,34,-38,10,-115,-41,-62,57,16,-10,1,-1,2,0,2,1,1,1,1,-2,0,68,68,68,68,68,68,68,68,68,68,68,68,12.592592593,11.446663419,14.098201264,13.588934725,9.3228655545,16.989381636,10.607399924,8.1187365216,13.603728429,10.793172691,9.8765432099,10.959571359,10.209042295,7.7651055569,12.266928361,12.242348532,11.617628488,15.476341494,10.32875677,7.781124498,2.7160493827,0.4870920604,3.8891589694,5.8238291677,-2.944062807,4.7470331043,-1.010228564,-7.357604973,3.2749716589,3.0120481928,2.962962963,1.9483682416,4.132231405,2.9119145838,0.7360157017,1.7489069332,1.2627857053,0.2537105163,0.7557626905,0.5020080321,12.839506173,6.3321967852,-13.36898396,-0.485319097,-28.94995093,-11.99250468,-16.92132845,14.207788913,3.2749716589,-3.012048193,15.802469136,8.2805650268,-9.236752552,2.4265954865,-28.21393523,-10.24359775,-15.65854275,14.461499429,4.0307343494,-2.510040161 +050,3,5,51,730,Virginia,Petersburg city,32420,32441,32502,32093,31995,32311,32242,31895,31379,30966,30573,30593,30446,61,-409,-98,316,-69,-347,-516,-413,-393,20,-147,127,517,490,480,480,461,487,431,483,475,593,110,397,357,402,442,530,532,544,545,551,526,17,120,133,78,38,-69,-45,-113,-62,-76,67,15,80,126,81,83,68,29,21,-17,10,8,30,-611,-357,151,-185,-347,-501,-320,-313,86,-222,45,-531,-231,232,-102,-279,-472,-299,-330,96,-214,-1,2,0,6,-5,1,1,-1,-1,0,0,1058,1061,1075,1052,1058,1058,917,884,884,884,884,884,16.007430916,15.291474223,14.928622524,14.871500937,14.375477493,15.393368524,13.826289197,15.697362648,15.531504431,19.430200364,12.291973063,11.14093122,12.502721363,13.69417378,16.52712163,16.815753706,17.451279172,17.712345017,18.016545139,17.234882616,3.7154578528,4.1505430034,2.4259011601,1.1773271575,-2.151644137,-1.422385182,-3.624989975,-2.014982369,-2.485040709,2.1953177477,2.4769719018,3.9320933716,2.5192050509,2.5715303704,2.1204608884,0.9166482283,0.6736707033,-0.552495166,0.3269790406,0.2621274923,-18.9178729,-11.14093122,4.6962958355,-5.73172432,-10.82058718,-15.83588836,-10.26545834,-10.17241099,2.8120197495,-7.27403791,-16.440901,-7.208837848,7.2155008864,-3.160193949,-8.700126292,-14.91924013,-9.591787633,-10.72490616,3.1389987902,-7.011910418 +050,3,5,51,735,Virginia,Poquoson city,12150,12159,12148,12043,12115,12093,12005,12018,11940,12041,12138,12228,12257,-11,-105,72,-22,-88,13,-78,101,97,90,29,19,86,84,99,83,105,88,106,99,108,97,23,100,99,107,103,107,113,125,143,111,119,-4,-14,-15,-8,-20,-2,-25,-19,-44,-3,-22,1,4,18,-1,0,4,6,5,1,3,4,-7,-96,69,-14,-71,10,-59,117,142,91,50,-6,-92,87,-15,-71,14,-53,122,143,94,54,-1,1,0,1,3,1,0,-2,-2,-1,-3,51,51,51,51,51,51,51,51,51,51,51,51,7.110082262,6.9542180644,8.1791143424,6.8885384679,8.7416226117,7.3461891644,8.8403319294,8.1889242731,8.8648116228,7.9232182969,8.267537514,8.1960427188,8.8400528751,8.5484272554,8.908129709,9.4331747224,10.424919728,11.828446172,9.1110563901,9.7202368797,-1.157455252,-1.241824654,-0.660938533,-1.659888787,-0.166507097,-2.086985558,-1.584587799,-3.639521899,-0.246244767,-1.797018583,0.3307015006,1.4901895852,-0.082617317,0,0.3330141947,0.5008765339,0.4169967891,0.0827164068,0.2462447673,0.3267306514,-7.936836013,5.7123934101,-1.156642432,-5.892605195,0.8325354868,-4.925285917,9.7577248655,11.745729765,7.4694246081,4.0841331427,-7.606134513,7.2025829953,-1.239259749,-5.892605195,1.1655496816,-4.424409383,10.174721655,11.828446172,7.7156693754,4.4108637942 +050,3,5,51,740,Virginia,Portsmouth city,95535,95531,95457,95767,96516,96123,95886,96407,95287,94964,94879,94582,95094,-74,310,749,-393,-237,521,-1120,-323,-85,-297,512,381,1593,1563,1515,1556,1520,1520,1424,1414,1444,1418,297,1007,1022,1023,1016,1053,1103,1112,1108,1052,1088,84,586,541,492,540,467,417,312,306,392,330,49,53,316,167,176,255,267,213,82,175,138,-212,-328,-94,-1058,-948,-193,-1808,-841,-466,-858,42,-163,-275,222,-891,-772,62,-1541,-628,-384,-683,180,5,-1,-14,6,-5,-8,4,-7,-7,-6,2,3416,3289,3366,3418,3081,2966,3192,2953,3066,3073,3017,3013,16.661088566,16.257287436,15.728902247,16.207573603,15.809207823,15.85860799,14.969697925,14.896519756,15.243242673,14.951812565,10.532150776,10.630164913,10.62090231,10.582837263,10.952036736,11.507924087,11.68982029,11.672803316,11.105187875,11.47219469,6.1289377902,5.6271225225,5.1079999377,5.6247363405,4.8571710879,4.3506839025,3.2798776353,3.2237164394,4.1380547976,3.4796178747,0.5543237251,3.2868220279,1.733812987,1.8332473999,2.6522026283,2.7856896929,2.2391472318,0.8638717256,1.8473458918,1.4551129294,-3.430531732,-0.97772554,-10.98427629,-9.874537131,-2.007353362,-18.86339687,-8.840952216,-4.909319806,-9.057273001,0.4428604568,-2.876208007,2.309096488,-9.250463302,-8.041289731,0.6448492665,-16.07770718,-6.601804984,-4.045448081,-7.209927109,1.8979733862 +050,3,5,51,750,Virginia,Radford city,16408,16395,16432,16817,16720,17124,17395,17301,17321,17470,18013,18107,18255,37,385,-97,404,271,-94,20,149,543,94,148,27,129,125,128,138,122,107,111,108,108,115,2,92,104,106,108,124,122,128,130,114,105,25,37,21,22,30,-2,-15,-17,-22,-6,10,18,55,67,36,47,22,21,18,7,16,12,-5,289,-190,337,190,-114,14,146,550,84,123,13,344,-123,373,237,-92,35,164,557,100,135,-1,4,5,9,4,0,0,2,8,0,3,2652,2652,3076,3097,3109,3208,3154,3003,2919,3472,3469,3469,7.7596318686,7.4544532904,7.5641177166,7.9955966279,7.0325109523,6.1810409566,6.3809605933,6.0874221458,5.9800664452,6.3252846378,5.5340010226,6.2021051376,6.264034984,6.257423448,7.1477980171,7.0475420253,7.3582248283,7.3274525829,6.3122923588,5.7752598867,2.225630846,1.2523481528,1.3000827325,1.73817318,-0.115287065,-0.866501069,-0.977264235,-1.240030437,-0.332225914,0.5500247511,3.3083701765,3.9955869637,2.1274081078,2.723137982,1.2681577127,1.2131014962,1.0347503665,0.3945551391,0.8859357697,0.6600297013,17.383981473,-11.330769,19.914903676,11.00843014,-6.571362693,0.8087343308,8.3929751947,31.000760928,4.6511627907,6.7653044387,20.69235165,-7.335182038,22.042311783,13.731568122,-5.30320498,2.0218358269,9.4277255612,31.395316067,5.5370985604,7.42533414 +050,3,5,51,760,Virginia,Richmond city,204214,204440,204375,206487,210922,214020,217238,221084,225669,227620,229621,231027,232226,-65,2112,4435,3098,3218,3846,4585,1951,2001,1406,1199,704,2820,2945,2861,2858,2976,3016,2914,2940,2970,3036,514,1867,1791,1895,1893,1793,1768,1840,1797,2027,2351,190,953,1154,966,965,1183,1248,1074,1143,943,685,165,591,677,522,635,777,902,943,552,722,583,-403,555,2460,1525,1523,1831,2406,-65,302,-251,-51,-238,1146,3137,2047,2158,2608,3308,878,854,471,532,-17,13,144,85,95,55,29,-1,4,-8,-18,12725,12782,12557,12598,12944,13336,13338,13660,12811,12515,12509,12511,13.727236882,14.110860092,13.465367038,13.254246878,13.579058318,13.501867923,12.857139706,12.859739175,12.894878519,13.107308533,9.0882096665,8.5815111797,8.9188642215,8.7789675786,8.1812001223,7.9148880925,8.1184409946,7.860187516,8.8006460464,10.149961252,4.639027216,5.529348912,4.5465028169,4.4752792992,5.3978581956,5.58697983,4.738698711,4.9995516588,4.0942324725,2.9573472811,2.8768783679,3.2438208088,2.45680587,2.9448729067,3.5453388148,4.0380254861,4.1607010097,2.414481641,3.134714576,2.5169831604,2.701637046,11.78700028,7.1774500991,7.063057381,8.3545886358,10.771052461,-0.286792753,1.320966405,-1.089769195,-0.22018206,5.5785154139,15.030821089,9.634255969,10.007930288,11.899927451,14.809077947,3.8739082572,3.735448046,2.0449453813,2.2968011 +050,3,5,51,770,Virginia,Roanoke city,97032,96910,96722,96791,98034,98884,99475,99741,99383,98989,98964,99216,99058,-188,69,1243,850,591,266,-358,-394,-25,252,-158,334,1455,1458,1489,1403,1445,1415,1300,1270,1383,1393,326,1248,1113,1205,1169,1090,1136,1303,1273,1305,1295,8,207,345,284,234,355,279,-3,-3,78,98,72,440,584,392,476,538,437,457,251,377,296,-270,-576,310,167,-110,-618,-1074,-844,-267,-204,-549,-198,-136,894,559,366,-80,-637,-387,-16,173,-253,2,-2,4,7,-9,-9,0,-4,-6,1,-3,2126,2111,2105,2104,2115,2126,2237,2115,2112,2102,2101,2100,15.037749402,14.967278327,15.123046141,14.146068492,14.506866918,14.212249653,13.106688444,12.831328649,13.95700878,14.051262394,12.89835825,11.425638393,12.238596776,11.786709955,10.942896153,11.409975694,13.136934648,12.861638874,13.169845595,13.062731372,2.139391152,3.5416399333,2.8844493647,2.3593585368,3.5639707654,2.8022739599,-0.030246204,-0.030310225,0.787163185,0.9885310227,4.5474981009,5.9951238291,3.9813526442,4.7993789039,5.4011725966,4.3892248046,4.6075050914,2.5359555046,3.8046220608,2.9857671707,-5.953088423,3.1823431284,1.6961374785,-1.109100167,-6.204320938,-10.78724815,-8.509265421,-2.697610039,-2.058734484,-5.537791138,-1.405590322,9.1774669575,5.6774901228,3.690278737,-0.803148341,-6.398023342,-3.901760329,-0.161654534,1.745887577,-2.552023967 +050,3,5,51,775,Virginia,Salem city,24802,24834,24897,25030,25190,25330,25441,25378,25268,25362,25271,25209,25340,63,133,160,140,111,-63,-110,94,-91,-62,131,58,233,244,229,230,256,218,211,219,195,227,40,281,310,323,266,333,382,345,353,366,348,18,-48,-66,-94,-36,-77,-164,-134,-134,-171,-121,11,91,76,46,39,30,35,32,16,23,20,36,91,151,186,110,-15,20,198,29,86,233,47,182,227,232,149,15,55,230,45,109,253,-2,-1,-1,2,-2,-1,-1,-2,-2,0,-1,1718,1713,1810,1739,1898,1997,1934,1932,1956,1995,1994,1996,9.3336270956,9.7172441258,9.0657165479,9.0602903232,10.074971959,8.6087746318,8.3349792613,8.6504848617,7.7258320127,8.9813843993,11.256434394,12.345679012,12.787015044,10.478422722,13.105334619,15.085100502,13.628283626,13.943475599,14.500792393,13.768818374,-1.922807299,-2.628434886,-3.721298496,-1.418132398,-3.03036266,-6.47632587,-5.293304365,-5.292990737,-6.77496038,-4.787433975,3.6453221704,3.0266825966,1.821060966,1.5363100983,1.1806607765,1.3821427161,1.2640726842,0.631998894,0.911251981,0.7913114008,3.6453221704,6.0135404221,7.3634204276,4.3331823285,-0.590330388,0.7897958378,7.8214497334,1.1454979954,3.4072900158,9.2187778195,7.2906443407,9.0402230187,9.1844813935,5.8694924268,0.5903303882,2.1719385539,9.0855224175,1.7774968894,4.3185419968,10.01008922 +050,3,5,51,790,Virginia,Staunton city,23746,23745,23738,24023,23808,24100,24287,24192,24218,24395,24583,24916,25190,-7,285,-215,292,187,-95,26,177,188,333,274,79,294,272,239,293,306,310,269,272,287,348,106,313,367,352,346,400,370,373,395,356,365,-27,-19,-95,-113,-53,-94,-60,-104,-123,-69,-17,5,26,44,28,57,48,96,97,65,82,64,15,276,-164,367,184,-48,-9,184,245,319,227,20,302,-120,395,241,0,87,281,310,401,291,0,2,0,10,-1,-1,-1,0,1,1,0,1185,1185,1543,1292,1542,1542,1283,1095,1087,994,993,992,12.311300015,11.373377099,9.9774567922,12.110690888,12.624022773,12.807271225,11.066998539,11.107027645,11.596193863,13.89055203,13.106928247,15.345696306,14.694831761,14.301361936,16.501990553,15.286097914,15.345689425,16.129690882,14.384128972,14.569113479,-0.795628232,-3.972319207,-4.717374969,-2.190671048,-3.87796778,-2.478826689,-4.278690885,-5.022663237,-2.78793511,-0.67856145,1.0887544231,1.8398110012,1.1689070719,2.356004712,1.9802388663,3.9661227019,3.9907020756,2.6542529299,3.3131982464,2.5545842813,11.557546953,-6.857477368,15.321031978,7.605348544,-1.980238866,-0.371824003,7.569991566,10.004491813,12.889149276,9.0607911228,12.646301376,-5.017666367,16.48993905,9.961353256,0,3.5942986986,11.560693642,12.658744743,16.202347522,11.615375404 +050,3,5,51,800,Virginia,Suffolk city,84585,84606,84859,84808,85320,85832,86976,88190,89360,90228,91135,92277,93913,253,-51,512,512,1144,1214,1170,868,907,1142,1636,275,1128,1093,1048,1102,1148,1185,1106,1205,1126,1150,227,689,697,758,688,699,753,747,810,818,931,48,439,396,290,414,449,432,359,395,308,219,33,28,178,112,145,168,133,89,9,47,43,168,-518,-45,122,585,596,606,421,503,784,1378,201,-490,133,234,730,764,739,510,512,831,1421,4,0,-17,-12,0,1,-1,-1,0,3,-4,1128,1128,1004,1016,1102,1102,1041,1068,1041,993,996,996,13.296633995,12.849148876,12.246424231,12.754039165,13.107566537,13.348352577,12.317081319,13.288267177,12.278367828,12.35297277,8.1217915093,8.1938305276,8.8576236328,7.9625943243,7.9810008792,8.4821177133,8.3190413613,8.9323621687,8.9198089547,10.000537086,5.1748424856,4.6553183485,3.3888005983,4.7914448405,5.1265656577,4.8662348634,3.9980399581,4.3559050082,3.3585588729,2.352435684,0.3300582907,2.092542086,1.3087781621,1.678163048,1.9181804688,1.4981695297,0.9911575384,0.0992484685,0.5125073605,0.4618937644,-6.106078377,-0.529013449,1.4256333551,6.7705198833,6.8049735679,6.8262461279,4.6885092545,5.5468866307,8.5490589493,14.802083893,-5.776020086,1.5635286373,2.7344115172,8.4486829313,8.7231540367,8.3244156576,5.6796667929,5.6461350992,9.0615663097,15.263977657 +050,3,5,51,810,Virginia,Virginia Beach city,437994,437885,438864,442654,445189,447922,449139,450635,451510,450417,450488,450766,451231,979,3790,2535,2733,1217,1496,875,-1093,71,278,465,1470,6191,6269,6021,6148,6128,6130,5699,5688,5545,5466,682,2786,2747,2992,2995,3069,3065,3151,3175,3398,3751,788,3405,3522,3029,3153,3059,3065,2548,2513,2147,1715,421,942,2521,1313,1537,1773,1524,1157,293,747,643,-188,-543,-3536,-1570,-3478,-3330,-3719,-4810,-2739,-2631,-1910,233,399,-1015,-257,-1941,-1557,-2195,-3653,-2446,-1884,-1267,-42,-14,28,-39,5,-6,5,12,4,15,17,9253,9315,9170,8872,9291,9362,9553,9539,9492,9789,9616,9620,14.046224808,14.121866141,13.483206455,13.706983137,13.621198212,13.58983312,12.637386396,12.627302546,12.305077148,12.119774234,6.3209146041,6.188030992,6.7001750062,6.6773608484,6.8217130079,6.79491656,6.9872617185,7.0484679295,7.5406045355,8.3171008329,7.7253102035,7.9338351488,6.7830314485,7.0296222888,6.7994852041,6.79491656,5.6501246775,5.5788346163,4.7644726126,3.8026734014,2.1372223823,5.6789319733,2.9402840184,3.4267457843,3.9409896263,3.3786143026,2.5656178383,0.6504570404,1.6576902849,1.4257253627,-1.231965768,-7.965372256,-3.515800388,-7.754210695,-7.401858689,-8.244794351,-10.66605169,-6.080552333,-5.838531646,-4.235047345,0.9052566142,-2.286440283,-0.575516369,-4.32746491,-3.460869063,-4.866180049,-8.100433849,-5.430095293,-4.180841361,-2.809321982 +050,3,5,51,820,Virginia,Waynesboro city,21006,20994,20989,21099,21065,21164,21303,21543,21759,22196,22390,22416,22741,-5,110,-34,99,139,240,216,437,194,26,325,66,293,295,272,294,275,306,281,284,283,306,86,242,249,246,243,293,284,287,263,276,276,-20,51,46,26,51,-18,22,-6,21,7,30,-1,6,20,22,69,85,83,94,48,77,61,14,55,-97,55,19,172,111,349,124,-58,234,13,61,-77,77,88,257,194,443,172,19,295,2,-2,-3,-4,0,1,0,0,1,0,0,192,192,192,192,192,192,192,192,192,192,192,192,13.923208515,13.992979793,12.882142603,13.846045164,12.836670868,14.133296384,12.785803663,12.739424932,12.632236754,13.552716079,11.499714883,11.811023622,11.650761325,11.444180187,13.676889325,13.117177036,13.058810147,11.797425201,12.319778601,12.224018425,2.4234936324,2.1819561711,1.2313812783,2.4018649775,-0.840218457,1.0161193478,-0.273006484,0.9419997309,0.3124581529,1.3286976548,0.2851168979,0.9486765961,1.0419380047,3.2495820284,3.9676982682,3.8335411759,4.2771015812,2.153142242,3.4370396822,2.7016852315,2.6135715643,-4.601081491,2.6048450117,0.8948124426,8.0287541427,5.1267839823,15.879877147,5.5622841251,-2.588938981,10.363841708,2.8986884623,-3.652404895,3.6467830164,4.144394471,11.996452411,8.9603251582,20.156978728,7.715426367,0.8481007008,13.065526939 +050,3,5,51,830,Virginia,Williamsburg city,14068,13679,13706,14095,14519,14615,14586,14815,14894,14990,15009,15019,15259,27,389,424,96,-29,229,79,96,19,10,240,30,118,87,105,119,97,135,129,107,114,96,10,105,89,130,122,77,48,58,60,96,126,20,13,-2,-25,-3,20,87,71,47,18,-30,12,101,168,100,92,104,74,61,31,49,38,-4,273,251,22,-116,105,-83,-36,-61,-57,231,8,374,419,122,-24,209,-9,25,-30,-8,269,-1,2,7,-1,-2,0,1,0,2,0,1,4171,4171,4205,4253,4262,4379,4446,4408,4385,4280,4280,4282,8.4889032769,6.0809394003,7.2080730418,8.150405808,6.5984150199,9.0881551045,8.633382412,7.133571119,7.5929132809,6.3412378625,7.5536851192,6.2207311106,8.9242809089,8.3558782233,5.2379170777,3.2313440372,3.8816758131,4.0001333378,6.3940322366,8.3228746945,0.9352181576,-0.13979171,-1.716207867,-0.205472415,1.3604979422,5.8568110674,4.7517065988,3.1334377813,1.1988810444,-1.981636832,7.2659256861,11.74250367,6.8648314684,6.3011540701,7.0745892997,4.9816553906,4.0824521483,2.0667355579,3.2636206208,2.5100733206,19.63958131,17.543859649,1.510262923,-7.944933393,7.1426141968,-5.587532398,-2.409316022,-4.066802227,-3.79645664,15.258603607,26.905506996,29.286363319,8.3750943914,-1.643779323,14.217203496,-0.605877007,1.6731361264,-2.000066669,-0.53283602,17.768676927 +050,3,5,51,840,Virginia,Winchester city,26203,26223,26150,26663,27012,27328,27398,27500,27789,28148,27889,28036,27700,-73,513,349,316,70,102,289,359,-259,147,-336,93,427,355,361,349,425,379,353,361,353,355,99,272,263,261,284,280,229,276,260,268,286,-6,155,92,100,65,145,150,77,101,85,69,17,81,71,99,173,208,213,166,105,122,103,-88,276,183,121,-165,-252,-72,116,-464,-60,-505,-71,357,254,220,8,-44,141,282,-359,62,-402,4,1,3,-4,-3,1,-2,0,-1,0,-3,976,976,945,879,831,878,883,933,999,1080,1079,1079,16.17026111,13.227759665,13.286713287,12.754449439,15.483259864,13.709779522,12.621341867,12.884344273,12.624050067,12.738624946,10.300494197,9.7997205403,9.6061832904,10.378978913,10.20073591,8.2837454105,9.8682446324,9.2795831326,9.5842646401,10.262666858,5.8697669134,3.4280391244,3.6805299963,2.3754705259,5.2825239535,5.4260341117,2.7530972344,3.60476114,3.0397854269,2.4759580881,3.0674265806,2.6455519329,3.6437246964,6.3224061689,7.5776895333,7.7049684386,5.9352485832,3.7475239574,4.3629861422,3.6959954069,10.451972052,6.8188169539,4.4534412955,-6.030040566,-9.180662319,-2.604496374,4.1475231064,-16.56048682,-2.14573089,-18.12114253,13.519398633,9.4643688868,8.0971659919,0.2923656032,-1.602972786,5.100472065,10.08277169,-12.81296286,2.2172552526,-14.42514712 +040,4,9,53,000,Washington,Washington,6724540,6724540,6743009,6827479,6898599,6966252,7057531,7167287,7299961,7427951,7526793,7614024,7693612,18469,84470,71120,67653,91279,109756,132674,127990,98842,87231,79588,22233,86692,86710,87251,87370,88779,90458,88947,86748,86235,86443,11846,49817,49429,51307,51279,53857,54714,56064,56834,58488,63769,10387,36875,37281,35944,36091,34922,35744,32883,29914,27747,22674,6084,20171,22202,19729,30898,33108,29102,30495,23605,23434,18301,2299,27355,11986,11979,24414,41636,67588,64346,45220,35962,38473,8383,47526,34188,31708,55312,74744,96690,94841,68825,59396,56774,-301,69,-349,1,-124,90,240,266,103,88,140,139375,139348,145193,145929,144245,145039,144164,146055,145644,146271,148155,148802,12.77654864,12.634344639,12.585926816,12.460261258,12.482268666,12.505211772,12.078697917,11.601402204,11.391062979,11.294101846,7.3419614682,7.2022029891,7.4010171476,7.3131479573,7.5722585695,7.5638435174,7.6132991561,7.6007987833,7.7258710676,8.3316587878,5.4345871718,5.4321416504,5.1849096683,5.1471133003,4.9100100964,4.9413682547,4.4653987612,4.0006034206,3.6651919114,2.9624430578,2.97277445,3.2350100298,2.8459014814,4.4065142765,4.6549628965,4.0231563045,4.1411165412,3.1568577837,3.0954736458,2.3910942225,4.031542565,1.7464566353,1.7279666402,3.4817994545,5.8539940546,9.3435876678,8.7379663865,6.0475792832,4.7503381092,5.0266416055,7.004317015,4.9814666651,4.5738681216,7.888313731,10.508956951,13.366743972,12.879082928,9.2044370669,7.8458117551,7.4177358281 +050,4,9,53,001,Washington,Adams County,18728,18731,18791,18876,18936,19080,19154,19208,19311,19574,19640,19959,20027,60,85,60,144,74,54,103,263,66,319,68,148,424,400,407,379,382,357,387,371,393,383,49,115,97,122,122,142,127,133,90,109,124,99,309,303,285,257,240,230,254,281,284,259,-4,-7,-21,-12,22,63,51,19,1,86,73,-37,-217,-228,-128,-210,-251,-179,-9,-217,-49,-263,-41,-224,-249,-140,-188,-188,-128,10,-216,37,-190,2,0,6,-1,5,2,1,-1,1,-2,-1,162,162,162,162,162,162,162,162,162,162,162,162,22.513075106,21.157304559,21.412037037,19.825286394,19.915541421,18.536306758,19.904847628,18.921813638,19.848986086,19.156704847,6.1061406536,5.1306463557,6.4183501684,6.3817544594,7.4031593765,6.5941483424,6.8406840684,4.5901973785,5.505189525,6.2021707598,16.406934452,16.026658204,14.993686869,13.443531935,12.512382045,11.942158415,13.064163559,14.331616259,14.343796561,12.954534087,-0.371678127,-1.110758489,-0.631313131,1.1508081812,3.2845002867,2.6480438225,0.9772405812,0.0510021931,4.3435440289,3.6512779473,-11.52202193,-12.0596636,-6.734006734,-10.98498718,-13.08586622,-9.294114593,-0.462903433,-11.0674759,-2.47480997,-13.15460411,-11.89370006,-13.17042209,-7.365319865,-9.834179003,-9.801365935,-6.64607077,0.514337148,-11.01647371,1.8687340589,-9.503326164 +050,4,9,53,003,Washington,Asotin County,21623,21623,21725,21984,21935,22167,22235,22167,22362,22612,22699,22687,22820,102,259,-49,232,68,-68,195,250,87,-12,133,62,252,230,252,241,249,226,202,222,236,229,33,216,241,269,227,260,262,231,255,263,291,29,36,-11,-17,14,-11,-36,-29,-33,-27,-62,1,-5,-13,-11,-16,-12,-2,-6,-9,-10,-5,69,227,-19,255,72,-42,235,284,130,26,199,70,222,-32,244,56,-54,233,278,121,16,194,3,1,-6,5,-2,-3,-2,1,-1,-1,1,174,174,174,174,174,174,174,174,174,174,174,174,11.530806012,10.473826818,11.42805315,10.855366875,11.215711004,10.150688315,8.982967937,9.7989450685,10.399682722,10.064385699,9.8835480107,10.97474897,12.198993243,10.22476465,11.711184181,11.767612118,10.272601948,11.255545011,11.589476931,12.789241216,1.6472580018,-0.500922152,-0.770940093,0.6306022251,-0.495473177,-1.616923802,-1.289634011,-1.456599943,-1.18979421,-2.724855517,-0.228785834,-0.591998907,-0.49884359,-0.720688257,-0.540516193,-0.0898291,-0.26682083,-0.39725453,-0.440664522,-0.219746413,10.386876845,-0.865229172,11.564101401,3.2430971578,-1.891806675,10.554919266,12.629519278,5.7381209861,1.1457277575,8.7459072231,10.158091011,-1.457228079,11.065257811,2.5224089005,-2.432322868,10.465090166,12.362698448,5.3408664563,0.7050632354,8.5261608104 +050,4,9,53,005,Washington,Benton County,175177,175168,176467,180449,182400,184362,186535,190282,193573,198229,201174,204173,206426,1299,3982,1951,1962,2173,3747,3291,4656,2945,2999,2253,656,2551,2602,2522,2541,2697,2734,2653,2541,2596,2590,265,1289,1218,1268,1298,1402,1497,1409,1510,1440,1623,391,1262,1384,1254,1243,1295,1237,1244,1031,1156,967,43,156,206,205,387,387,318,338,259,275,218,812,2550,395,519,580,2065,1741,3074,1664,1569,1062,855,2706,601,724,967,2452,2059,3412,1923,1844,1280,53,14,-34,-16,-37,0,-5,0,-9,-1,6,1426,1426,1426,1426,1426,1426,1425,1423,1421,1421,1421,1421,14.294679981,14.342054133,13.752787912,13.701917244,14.314640794,14.24496229,13.542554658,12.723990556,12.808778651,12.615715089,7.222988042,6.7135364849,6.9145658492,6.9992477696,7.4412778617,7.7998202446,7.1924084104,7.5612852182,7.1050235971,7.9055233939,7.0716919387,7.6285176478,6.8382220623,6.7026694743,6.8733629321,6.4451420458,6.3501462473,5.1627053377,5.7037550543,4.7101916955,0.8741552634,1.1354585516,1.1178911665,2.0868327325,2.0540474554,1.6568756431,1.7253612794,1.2969356765,1.3568621453,1.0618632778,14.289076421,2.1772142131,2.8301732459,3.1275529325,10.960227378,9.0711336312,15.691599328,8.332436161,7.7415152943,5.1729302799,15.163231685,3.3126727647,3.9480644123,5.214385665,13.014274834,10.728009274,17.416960608,9.6293718375,9.0983774396,6.2347935577 +050,4,9,53,007,Washington,Chelan County,72453,72460,72747,73213,73471,73723,74114,75030,75809,76216,76612,77053,77574,287,466,258,252,391,916,779,407,396,441,521,266,945,941,927,900,979,931,871,840,896,879,113,645,671,660,712,710,693,655,712,731,760,153,300,270,267,188,269,238,216,128,165,119,1,21,4,44,30,32,11,-20,-32,8,6,137,149,-5,-45,187,614,532,213,300,268,396,138,170,-1,-1,217,646,543,193,268,276,402,-4,-4,-11,-14,-14,1,-2,-2,0,0,0,931,931,931,931,931,931,931,931,931,931,931,931,12.948753083,12.830301873,12.595622104,12.175571745,13.128251891,12.344287618,11.458641671,10.99275002,11.661731689,11.369295143,8.8380378186,9.1489187641,8.9677568379,9.6322300912,9.5209998391,9.188605069,8.6170037823,9.3176643024,9.514202974,9.8301072904,4.1107152645,3.6813831093,3.6278652662,2.5433416533,3.6072520517,3.1556825489,2.8416378885,1.6750857173,2.1475287151,1.5391878521,0.2877500685,0.054539009,0.5978504559,0.4058523915,0.4291154857,0.1458508741,-0.263114619,-0.418771429,0.1041226044,0.0776061102,2.041655248,-0.068173761,-0.611437966,2.5298132403,8.233653382,7.0538786388,2.8021706956,3.9259821499,3.4881072463,5.1220032724,2.3294053165,-0.013634752,-0.01358751,2.9356656317,8.6627688677,7.1997295129,2.5390560763,3.5072107205,3.5922298506,5.1996093826 +050,4,9,53,009,Washington,Clallam County,71404,71396,71505,71778,71791,72091,72518,73261,74351,75741,76792,77457,78067,109,273,13,300,427,743,1090,1390,1051,665,610,165,686,655,661,694,663,699,646,623,590,595,197,919,942,929,928,982,935,1003,1015,1134,1171,-32,-233,-287,-268,-234,-319,-236,-357,-392,-544,-576,20,39,47,63,96,93,77,84,66,94,73,121,469,262,504,562,962,1245,1658,1373,1119,1121,141,508,309,567,658,1055,1322,1742,1439,1213,1194,0,-2,-9,1,3,7,4,5,4,-4,-8,1899,1899,1899,1899,1890,1875,1890,1888,1885,1869,1818,1815,9.575455567,9.1245324548,9.1880846805,9.598296095,9.0959603235,9.4707747338,8.608053727,8.1687241449,7.6499685573,7.651552172,12.827760446,13.122610034,12.913359559,12.834609188,13.472448021,12.668346747,13.36513605,13.308595517,14.703498888,15.058769065,-3.252304879,-3.998077579,-3.725274878,-3.236313093,-4.376487697,-3.197572013,-4.757082323,-5.139871372,-7.053530331,-7.407216893,0.5443772115,0.6547374433,0.8757176019,1.3277181918,1.2759039368,1.0432756144,1.1193134877,0.8653865065,1.2188085498,0.9387618631,6.5464849284,3.6498129819,7.0057408154,7.7726835812,13.198060077,16.868547273,22.093116222,18.002661719,14.509008162,14.415781487,7.09086214,4.3045504252,7.8814584173,9.1004017731,14.473964014,17.911822887,23.21242971,18.868048226,15.727816712,15.35454335 +050,4,9,53,011,Washington,Clark County,425363,425360,426733,432388,436532,441591,448505,457320,465911,475238,482467,489271,496865,1373,5655,4144,5059,6914,8815,8591,9327,7229,6804,7594,1341,5485,5344,5463,5341,5639,5631,5592,5454,5630,5621,720,2969,3021,3098,3136,3386,3452,3455,3508,3890,4207,621,2516,2323,2365,2205,2253,2179,2137,1946,1740,1414,190,417,165,149,381,445,499,521,343,353,275,564,2720,1729,2578,4291,6073,5902,6643,4929,4703,5913,754,3137,1894,2727,4672,6518,6401,7164,5272,5056,6188,-2,2,-73,-33,37,44,11,26,11,8,-8,3210,3211,3457,3457,3464,3439,3431,3420,3424,3425,3428,3437,12.768864921,12.300326843,12.442448267,12.000952706,12.450528524,12.198463873,11.883346845,11.38972857,11.587485516,11.400050297,6.9117155791,6.9534594669,7.055959131,7.0464309468,7.4760577374,7.4780851163,7.3420892972,7.3258466856,8.0062732959,8.532291692,5.8571493422,5.3468673756,5.3864891365,4.9545217595,4.9744707863,4.7203787568,4.541257548,4.0638818843,3.5812122198,2.8677586053,0.9707596485,0.3797817981,0.3393602035,0.8560874333,0.9825297381,1.080986232,1.1071573152,0.7162957278,0.7265332837,0.557732402,6.3320533429,3.9796529025,5.8716147966,9.6416566303,13.40877101,12.785532548,14.116787034,10.293357558,9.679563833,11.992260702,7.3028129914,4.3594347005,6.2109750001,10.497744064,14.391300748,13.86651878,15.223944349,11.009653286,10.406097117,12.549993104 +050,4,9,53,013,Washington,Columbia County,4078,4078,4094,4005,3977,4002,3984,3961,3983,4010,4055,4023,4048,16,-89,-28,25,-18,-23,22,27,45,-32,25,6,41,26,34,39,37,38,31,37,32,29,22,63,46,44,51,74,47,62,55,39,48,-16,-22,-20,-10,-12,-37,-9,-31,-18,-7,-19,1,1,1,9,19,15,19,18,18,15,14,29,-69,-8,26,-26,0,12,40,46,-39,29,30,-68,-7,35,-7,15,31,58,64,-24,43,2,1,-1,0,1,-1,0,0,-1,-1,1,75,75,75,75,75,75,75,75,75,75,75,75,10.124706754,6.5146579805,8.5223712245,9.7670924117,9.3140339836,9.5669687815,7.7567871888,9.175449473,7.9227531567,7.1862222773,15.557476232,11.52593335,11.028950996,12.772351615,18.628067967,11.832829809,15.513574378,13.639181649,9.6558554098,11.894436873,-5.432769478,-5.01127537,-2.506579772,-3.005259204,-9.314033984,-2.265861027,-7.756787189,-4.463732176,-1.733102253,-4.708214595,0.2469440672,0.2505637685,2.2559217947,4.7583270724,3.7759597231,4.7834843907,4.5039409483,4.4637321761,3.7137905422,3.4692107546,-17.03914063,-2.004510148,6.5171074069,-6.511394941,0,3.0211480363,10.008757663,11.407315561,-9.65585541,7.1862222773,-16.79219657,-1.753946379,8.7730292017,-1.753067869,3.7759597231,7.804632427,14.512698611,15.871047737,-5.942064868,10.655433032 +050,4,9,53,015,Washington,Cowlitz County,102410,102408,102358,102313,101669,101497,101811,103031,104760,106800,108673,110389,111371,-50,-45,-644,-172,314,1220,1729,2040,1873,1716,982,295,1249,1206,1141,1138,1239,1261,1280,1274,1246,1256,295,942,1044,1056,1125,1147,1106,1189,1232,1199,1275,0,307,162,85,13,92,155,91,42,47,-19,1,24,36,49,65,36,8,8,-1,6,9,-40,-376,-846,-300,257,1089,1564,1936,1830,1667,994,-39,-352,-810,-251,322,1125,1572,1944,1829,1673,1003,-11,0,4,-6,-21,3,2,5,2,-4,-2,1207,1207,1207,1207,1207,1207,1207,1207,1208,1208,1208,1208,12.204953315,11.824572756,11.232194363,11.19483739,12.097128519,12.137195547,12.100586122,11.825147466,11.375774895,11.327561328,9.2050168319,10.236197312,10.395440182,11.066952604,11.198875231,10.645311876,11.240310078,11.43530744,10.946672631,11.498917749,2.9999364834,1.5883754449,0.8367541813,0.1278847856,0.8982532879,1.4918836716,0.8602760446,0.3898400264,0.4291022633,-0.171356421,0.2345227218,0.3529723211,0.4823641751,0.6394239282,0.351490417,0.0770004476,0.0756286633,-0.009281905,0.0547790123,0.0811688312,-3.674189309,-8.294849546,-2.953250052,2.5281838393,10.632585114,15.053587499,18.30213651,16.985886863,15.219435594,8.9646464646,-3.439666587,-7.941877224,-2.470885877,3.1676077675,10.984075531,15.130587947,18.377765173,16.976604957,15.274214606,9.0458152958 +050,4,9,53,017,Washington,Douglas County,38431,38427,38513,38660,39192,39379,39757,40521,41312,41961,42518,43251,43560,86,147,532,187,378,764,791,649,557,733,309,141,540,518,506,521,539,523,517,515,523,492,99,306,283,306,307,307,310,291,306,304,363,42,234,235,200,214,232,213,226,209,219,129,4,-9,-14,29,90,106,69,42,22,104,80,42,-75,314,-42,81,428,510,382,326,412,99,46,-84,300,-13,171,534,579,424,348,516,179,-2,-3,-3,0,-7,-2,-1,-1,0,-2,1,190,190,190,190,190,190,190,190,190,190,190,190,13.994531766,13.307301033,12.880070255,13.167205823,13.428336531,12.782129459,12.416989901,12.192379171,12.195548508,11.334969071,7.9302346676,7.2702050044,7.7891333953,7.7587949858,7.6484217345,7.5764056065,6.9890600795,7.2444039347,7.0888083107,8.3629954729,6.0642970987,6.0370960284,5.0909368597,5.408410837,5.7799147961,5.2057238522,5.4279298212,4.9479752364,5.1067401975,2.9719735978,-0.233242196,-0.359656785,0.7381858447,2.2745653053,2.6408231396,1.6863612479,1.0087303208,0.5208394986,2.4251186326,1.8430844017,-1.943684968,8.0665878847,-1.069096741,2.0471087748,10.662946262,12.464409224,9.1746424411,7.717894388,9.6072007369,2.2808169472,-2.176927164,7.7069311,-0.330910896,4.3216740801,13.303769401,14.150770472,10.183372762,8.2387338865,12.032319369,4.1239013489 +050,4,9,53,019,Washington,Ferry County,7551,7554,7545,7641,7668,7598,7597,7526,7534,7587,7661,7676,7759,-9,96,27,-70,-1,-71,8,53,74,15,83,21,54,74,71,76,69,64,77,76,57,67,34,85,82,82,90,82,80,88,86,75,84,-13,-31,-8,-11,-14,-13,-16,-11,-10,-18,-17,3,8,5,3,2,1,1,1,1,1,1,3,118,30,-63,14,-60,25,64,83,32,100,6,126,35,-60,16,-59,26,65,84,33,101,-2,1,0,1,-3,1,-2,-1,0,0,-1,252,252,250,251,251,252,253,253,252,252,251,251,7.1118135124,9.6675158404,9.3017162321,10.003290556,9.1251735767,8.4993359894,10.184511606,9.9685204617,7.4330051509,8.6815678652,11.19452127,10.712652688,10.742827198,11.846001974,10.844409178,10.624169987,11.639441836,11.280167891,9.7802699355,10.884353741,-4.082707757,-1.045136848,-1.441110966,-1.842711418,-1.719235601,-2.124833997,-1.454930229,-1.311647429,-2.347264785,-2.202785876,1.0536020018,0.6532105298,0.3930302633,0.2632444883,0.1322488924,0.1328021248,0.1322663845,0.1311647429,0.1304035991,0.1295756398,15.540629527,3.9192631785,-8.25363553,1.8427114182,-7.934933545,3.3200531208,8.4650486079,10.886673662,4.1729151725,12.957563978,16.594231529,4.5724737083,-7.860605267,2.1059559065,-7.802684653,3.4528552457,8.5973149924,11.017838405,4.3033187716,13.087139618 +050,4,9,53,021,Washington,Franklin County,78163,78160,79076,83048,85691,86441,87640,88681,90132,91803,93950,95446,97075,916,3972,2643,750,1199,1041,1451,1671,2147,1496,1629,423,1683,1761,1629,1582,1673,1647,1617,1600,1488,1530,114,350,376,366,354,363,372,395,418,413,486,309,1333,1385,1263,1228,1310,1275,1222,1182,1075,1044,-14,59,65,116,179,206,182,78,25,277,209,567,2559,1158,-635,-199,-468,-2,367,935,140,372,553,2618,1223,-519,-20,-262,180,445,960,417,581,54,21,35,6,-9,-7,-4,4,5,4,4,1846,1846,2749,2896,2884,2858,2889,2837,2905,2899,2884,2818,20.761885964,20.872471687,18.927334836,18.175447062,18.976752627,18.421479423,17.77557919,17.227178027,15.713109041,15.894369965,4.3176827613,4.4565867997,4.2525503683,4.067072225,4.1174902592,4.1607713086,4.34221013,4.5006002595,4.3612325498,5.0487998712,16.444203202,16.415884887,14.674784468,14.108374837,14.859262368,14.260708114,13.43336906,12.726577767,11.351876492,10.845570094,0.7278379512,0.7704205904,1.347802849,2.0565139217,2.3366473647,2.0356461779,0.857449089,0.2691746567,2.925088175,2.1711917142,31.568429104,13.725339133,-7.378058699,-2.286292013,-5.308499838,-0.022369738,4.0344078929,10.067132159,1.4783839152,3.8645134816,32.296267055,14.495759724,-6.03025585,-0.229778092,-2.971852474,2.0132764396,4.8918569819,10.336306816,4.4034720902,6.0357051958 +050,4,9,53,023,Washington,Garfield County,2266,2266,2261,2237,2209,2239,2202,2223,2255,2224,2257,2266,2290,-5,-24,-28,30,-37,21,32,-31,33,9,24,3,20,21,19,20,25,33,31,18,23,19,13,26,39,21,22,21,26,19,40,21,23,-10,-6,-18,-2,-2,4,7,12,-22,2,-4,0,0,0,3,4,5,8,8,6,5,3,6,-20,-10,29,-41,14,16,-51,50,1,25,6,-20,-10,32,-37,19,24,-43,56,6,28,-1,2,0,0,2,-2,1,0,-1,1,0,36,36,36,36,36,36,36,36,36,36,36,36,8.8928412628,9.4466936572,8.5431654676,9.0069804098,11.299435028,14.738722644,13.84237553,8.0339209998,10.17024099,8.3406496927,11.560693642,17.543859649,9.4424460432,9.9076784508,9.4915254237,11.612326932,8.4840366153,17.853157777,9.2858722087,10.096575944,-2.667852379,-8.097165992,-0.899280576,-0.900698041,1.8079096045,3.1263957124,5.3583389149,-9.819236778,0.8843687818,-1.755926251,0,0,1.3489208633,1.801396082,2.2598870056,3.5730236713,3.5722259433,2.6779736666,2.2109219545,1.3169446883,-8.892841263,-4.498425551,13.039568345,-18.46430984,6.3276836158,7.1460473426,-22.77294039,22.316447222,0.4421843909,10.974539069,-8.892841263,-4.498425551,14.388489209,-16.66291376,8.5875706215,10.719071014,-19.20071445,24.994420888,2.6531063453,12.291483758 +050,4,9,53,025,Washington,Grant County,89120,89124,89554,90588,91292,91698,92898,93517,94144,95262,96497,97959,99377,430,1034,704,406,1200,619,627,1118,1235,1462,1418,430,1613,1577,1529,1498,1502,1465,1453,1494,1473,1474,201,649,681,651,674,657,668,710,759,674,754,229,964,896,878,824,845,797,743,735,799,720,-7,-27,-68,124,305,258,271,116,51,412,322,205,100,-104,-596,87,-482,-439,265,448,250,373,198,73,-172,-472,392,-224,-168,381,499,662,695,3,-3,-20,0,-16,-2,-2,-6,1,1,3,1245,1245,1214,1228,1218,1244,1243,1244,1242,1226,1243,1255,17.908094725,17.341104025,16.711295699,16.230037487,16.114583054,15.613260081,15.342702977,15.58205873,15.149956803,14.938987311,7.2054268299,7.4884539257,7.115142904,7.3024334222,7.0487889923,7.1192202962,7.4971225832,7.9161864632,6.9321594602,7.6417886245,10.702667895,9.852650099,9.5961527952,8.9276040651,9.0657940616,8.4940397845,7.8455803934,7.6658722668,8.2177973423,7.2971986865,-0.29976352,-0.747745766,1.355265315,3.3045136406,2.7680175952,2.888186677,1.2248819995,0.5319176675,4.2374624594,3.2634694126,1.1102352589,-1.143611172,-6.514017159,0.9425989729,-5.171257678,-4.678649266,2.7982218092,4.6725316674,2.5712757642,3.7803543195,0.810471739,-1.891356939,-5.158751844,4.2471126135,-2.403240083,-1.790462589,4.0231038087,5.2044493348,6.8087382236,7.0438237321 +050,4,9,53,027,Washington,Grays Harbor County,72797,72800,72849,72374,71785,71059,70796,71027,71555,72507,73787,75047,75950,49,-475,-589,-726,-263,231,528,952,1280,1260,903,219,829,798,794,746,789,776,736,744,724,748,196,798,767,841,804,824,832,851,888,887,978,23,31,31,-47,-58,-35,-56,-115,-144,-163,-230,9,40,28,26,17,5,-4,-12,-17,-7,0,28,-546,-656,-714,-217,267,590,1074,1438,1433,1136,37,-506,-628,-688,-200,272,586,1062,1421,1426,1136,-11,0,8,9,-5,-6,-2,5,3,-3,-3,2731,2731,2731,2725,2714,2714,2696,2695,2699,2695,2704,2717,11.416924316,11.071108984,11.117022766,10.517782242,11.12654506,10.884964442,10.217822882,10.171298891,9.7289597807,9.9074816056,10.989994698,10.641028309,11.775083308,11.335518663,11.620118034,11.670477339,11.814357707,12.139937386,11.91931951,12.953899746,0.4269296186,0.4300806748,-0.658060542,-0.817736421,-0.493572975,-0.785512898,-1.596534825,-1.968638495,-2.19035973,-3.046418141,0.5508769272,0.3884599643,0.3640334911,0.2396813648,0.070510425,-0.056108064,-0.166594938,-0.232408711,-0.094064528,0,-7.519470056,-9.101062022,-9.996919717,-3.059462127,3.7652566932,8.2759394594,14.910246977,19.65904275,19.256352715,15.046656556,-6.968593129,-8.712602057,-9.632886226,-2.819780762,3.8357671182,8.2198313953,14.743652039,19.426634038,19.162288187,15.046656556 +050,4,9,53,029,Washington,Island County,78506,78508,78700,78970,79086,78266,78777,80135,81826,83362,84391,85344,86014,192,270,116,-820,511,1358,1691,1536,1029,953,670,244,914,895,896,882,877,965,965,887,900,885,113,675,641,623,686,702,724,784,784,808,817,131,239,254,273,196,175,241,181,103,92,68,106,82,397,185,233,387,237,84,-84,59,59,-34,-48,-529,-1294,86,787,1207,1261,1006,802,550,72,34,-132,-1109,319,1174,1444,1345,922,861,609,-11,-3,-6,16,-4,9,6,10,4,0,-7,1466,1463,1635,1808,1676,1674,1907,1901,1941,1903,1995,1998,11.593835225,11.325099965,11.388479333,11.232592347,11.037555377,11.916449022,11.683657409,10.575071683,10.604766253,10.329252209,8.5621868459,8.1110492484,7.9185520362,8.7364607146,8.835078534,8.9404239292,9.4922149309,9.3470757602,9.5207234807,9.5355921521,3.0316483795,3.2140507162,3.4699272968,2.4961316327,2.2024768425,2.9760250925,2.1914424777,1.2279959226,1.0840427726,0.7936600567,1.0401471428,5.0235359619,2.3514159337,2.9673401552,4.8706202175,2.9266304851,1.0170230283,-1.001472403,0.6952013433,0.6886168139,-0.60886662,-6.693830035,-16.44720118,1.0952414307,9.9048530004,14.904822766,15.267452842,11.993824254,9.450025039,6.4193092823,0.4312805226,-1.670294073,-14.09578525,4.0625815859,14.775473218,17.831453251,16.28447587,10.992351851,10.145226382,7.1079260962 +050,4,9,53,031,Washington,Jefferson County,29872,29880,29899,29858,29808,30021,30172,30376,30949,31264,31864,32347,32700,19,-41,-50,213,151,204,573,315,600,483,353,47,209,180,199,193,196,185,176,169,204,192,101,371,328,328,326,370,358,374,387,404,437,-54,-162,-148,-129,-133,-174,-173,-198,-218,-200,-245,6,10,7,18,18,9,13,14,9,9,9,64,112,91,318,261,366,730,495,807,677,596,70,122,98,336,279,375,743,509,816,686,605,3,-1,0,6,5,3,3,4,2,-3,-7,631,631,630,631,631,631,631,631,631,627,631,630,6.9949964021,6.0335869675,6.6522923666,6.4127057964,6.4742022858,6.033428455,5.6579814508,5.3542009885,6.3540514865,5.9034236783,12.416955336,10.994536252,10.964582393,10.831824299,12.221708397,11.675499389,12.023210583,12.260803447,12.583513728,13.436438268,-5.421958934,-4.960949284,-4.312290027,-4.419118502,-5.747506111,-5.642070934,-6.365229132,-6.906602458,-6.229462242,-7.533014589,0.3346888231,0.2346394932,0.6017148874,0.5980761883,0.2972847988,0.4239706482,0.4500667063,0.2851349639,0.2803258009,0.2767229849,3.7485148183,3.0503134113,10.630296345,8.6721047298,12.089581819,23.807582552,15.91307283,25.567101762,21.086729688,18.325211001,4.0832036414,3.2849529045,11.232011232,9.270180918,12.386866618,24.2315532,16.363139537,25.852236725,21.367055489,18.601933986 +050,4,9,53,033,Washington,King County,1931249,1931289,1938431,1974499,2011708,2047967,2086174,2127372,2167863,2205001,2228488,2249653,2274315,7142,36068,37209,36259,38207,41198,40491,37138,23487,21165,24662,6302,24504,24478,25149,25255,25244,25972,25667,24792,24434,24583,2831,12142,11963,12475,12337,12821,12931,13072,13059,13590,15094,3471,12362,12515,12674,12918,12423,13041,12595,11733,10844,9489,3642,13505,13548,12845,20130,21668,19263,21670,17662,15419,11943,230,10151,11007,10604,5145,7076,8129,2851,-5847,-5122,3111,3872,23656,24555,23449,25275,28744,27392,24521,11815,10297,15054,-201,50,139,136,14,31,58,22,-61,24,119,37128,37116,37744,37658,37882,38128,38209,38775,38702,38754,39759,40296,12.524629881,12.281349162,12.389661734,12.217773898,11.982306589,12.093401176,11.739217135,11.183968202,10.912563941,10.867892965,6.2060910878,6.0021970761,6.1458121648,5.9683498942,6.0856105523,6.0210908134,5.978690396,5.8910713436,6.0694828501,6.6729030798,6.3185387932,6.2791520862,6.2438495692,6.2494240037,5.896696037,6.0723103625,5.7605267395,5.2928968584,4.843081091,4.194989885,6.9027557355,6.79743927,6.328092766,9.738419662,10.28492391,8.9694743128,9.9111246085,7.9675397864,6.8863396664,5.2798781954,5.1884393536,5.5225431093,5.2240635026,2.4890297646,3.3586912306,3.7851246789,1.3039509118,-2.637651746,-2.287556377,1.3753412933,12.091195089,12.319982379,11.552156269,12.227449427,13.64361514,12.754598992,11.21507552,5.3298880408,4.5987832898,6.6552194887 +050,4,9,53,035,Washington,Kitsap County,251133,251143,251696,254351,254414,252538,253568,259467,263419,266636,269583,272299,272787,553,2655,63,-1876,1030,5899,3952,3217,2947,2716,488,766,2961,3029,2877,2935,3040,3092,3092,2968,3050,3001,506,2033,1920,2015,2086,2154,2167,2257,2265,2346,2647,260,928,1109,862,849,886,925,835,703,704,354,131,189,577,291,347,417,273,195,49,105,89,181,1534,-1625,-3091,-112,4535,2748,2182,2187,1899,38,312,1723,-1048,-2800,235,4952,3021,2377,2236,2004,127,-19,4,2,62,-54,61,6,5,8,8,7,8722,8724,9527,9424,8760,8933,9531,9433,9300,9132,9539,9538,11.702470324,11.907265633,11.350187,11.598360818,11.851043301,11.826669676,11.666713832,11.07010382,11.257063346,11.011106504,8.0348268046,7.5476890116,7.9494705613,8.2433324244,8.397087918,8.2886135793,8.5160973861,8.4480408191,8.6587116752,9.712228896,3.6676435193,4.3595766218,3.4007164386,3.3550283933,3.4539553832,3.5380560964,3.1506164455,2.6220630004,2.5983516707,1.2988776083,0.7469661909,2.2682377915,1.148037684,1.3712542432,1.6256200844,1.0442046641,0.7357727028,0.182761148,0.3875382463,0.326553975,6.0626779726,-6.388018044,-12.19444839,-0.442595029,17.679105714,10.5108953,8.233107885,8.1571149101,7.008905998,0.1394275399,6.8096441635,-4.119780252,-11.04641071,0.9286592137,19.304725798,11.555099964,8.9688805879,8.3398760581,7.3964442443,0.4659815148 +050,4,9,53,037,Washington,Kittitas County,40915,40910,40992,41561,41636,41845,42619,43120,44922,46164,47341,47856,49204,82,569,75,209,774,501,1802,1242,1177,515,1348,102,427,404,427,367,408,405,425,408,410,407,95,282,272,288,279,287,312,315,313,338,363,7,145,132,139,88,121,93,110,95,72,44,19,74,74,61,90,90,66,79,64,55,37,57,347,-126,17,583,290,1630,1044,1014,386,1275,76,421,-52,78,673,380,1696,1123,1078,441,1312,-1,3,-5,-8,13,0,13,9,4,2,-8,2417,2417,2417,2223,2208,2378,2142,2427,2532,2615,2594,2815,10.344869357,9.7118886498,10.229872666,8.6900928206,9.5172558579,9.2001544717,9.3318402389,8.7268060532,8.6137168188,8.3865650113,6.8319746103,6.5386973088,6.8997736012,6.6063648418,6.694736351,7.0875264079,6.9165404124,6.6948291535,7.1010641092,7.4799093344,3.5128947464,3.173191341,3.3300990645,2.0837279788,2.8225195069,2.1126280639,2.4152998265,2.0319768996,1.5126527096,0.9066556769,1.7927876637,1.7789102972,1.4614103808,2.1310854328,2.0993946745,1.4992844324,1.7346244209,1.3689107534,1.1554985976,0.762415001,8.4067205311,-3.028955371,0.4072783028,13.804697859,6.7647161735,37.027782195,22.923391081,21.68867975,8.1094992489,26.272408819,10.199508195,-1.250045074,1.8686886837,15.935783292,8.864110848,38.527066627,24.658015502,23.057590503,9.2649978466,27.03482382 +050,4,9,53,039,Washington,Klickitat County,20318,20317,20375,20691,20640,20873,20863,21009,21295,21757,22095,22433,22697,58,316,-51,233,-10,146,286,462,338,338,264,67,226,207,193,203,198,195,195,231,203,217,60,168,193,167,182,173,175,215,209,200,234,7,58,14,26,21,25,20,-20,22,3,-17,2,5,6,10,0,8,12,3,-3,18,10,45,252,-66,192,-27,113,254,477,317,318,273,47,257,-60,202,-27,121,266,480,314,336,283,4,1,-5,5,-4,0,0,2,2,-1,-2,198,198,198,198,198,198,198,198,198,198,198,198,11.006672186,10.016694491,9.2982921013,9.7278129193,9.4573939626,9.2189863843,9.0588125987,10.53543738,9.1178584262,9.6166629736,8.1819510057,9.3392368924,8.04567244,8.7214874449,8.2632785632,8.2734493192,9.9879215832,9.5320623917,8.9831117499,10.370042101,2.8247211805,0.6774575984,1.2526196613,1.0063254744,1.1941153993,0.9455370651,-0.929108984,1.0033749886,0.1347466762,-0.753379127,0.2435104466,0.2903389707,0.4817767928,0,0.3821169278,0.567322239,0.1393663477,-0.136823862,0.8084800575,0.4431641923,12.272926509,-3.193728678,9.250114422,-1.293847039,5.3974016049,12.008320726,22.15924928,14.457721427,14.283147682,12.098382451,12.516436955,-2.903389707,9.7318912148,-1.293847039,5.7795185327,12.575642965,22.298615628,14.320897565,15.09162774,12.541546643 +050,4,9,53,041,Washington,Lewis County,75455,75457,75503,75674,75452,74994,74877,75474,76709,78269,79466,80599,82109,46,171,-222,-458,-117,597,1235,1560,1197,1133,1510,244,921,862,884,817,869,952,939,867,921,908,159,868,809,849,769,885,869,911,936,950,964,85,53,53,35,48,-16,83,28,-69,-29,-56,15,65,33,37,55,90,67,51,39,73,63,-47,58,-306,-534,-215,527,1083,1475,1224,1091,1512,-32,123,-273,-497,-160,617,1150,1526,1263,1164,1575,-7,-5,-2,4,-5,-4,2,6,3,-2,-9,941,941,944,955,955,948,925,941,921,933,907,901,12.184393129,11.407699535,11.751724871,10.902709664,11.559617163,12.511252899,12.117848985,10.993121374,11.507824946,11.161098409,11.483228269,10.706298056,11.286441647,10.26215879,11.772452461,11.420460892,11.756507375,11.868006467,11.87017774,11.849448091,0.7011648597,0.7014014796,0.4652832245,0.6405508738,-0.212835299,1.090792007,0.3613416098,-0.874885092,-0.362352794,-0.688349682,0.8599191676,0.436721676,0.4918708374,0.7339645428,1.1971985554,0.880518849,0.6581579321,0.4945002694,0.9121294474,0.7743933918,0.767312488,-4.049600995,-7.098892626,-2.869134122,7.0102626521,14.23286438,19.034959801,15.519700764,13.631962015,18.585441404,1.6272316556,-3.612879319,-6.607021789,-2.135169579,8.2074612074,15.113383229,19.693117733,16.014201033,14.544091463,19.359834796 +050,4,9,53,043,Washington,Lincoln County,10570,10570,10572,10527,10430,10295,10224,10287,10339,10586,10708,10938,11090,2,-45,-97,-135,-71,63,52,247,122,230,152,27,107,86,97,96,99,100,106,100,99,102,28,127,117,106,103,97,113,119,129,115,123,-1,-20,-31,-9,-7,2,-13,-13,-29,-16,-21,0,3,2,2,2,1,2,1,1,1,1,4,-27,-70,-129,-68,61,64,259,150,247,175,4,-24,-68,-127,-66,62,66,260,151,248,176,-1,-1,2,1,2,-1,-1,0,0,-2,-3,94,94,94,94,94,94,94,94,94,94,94,94,10.14266079,8.2072815766,9.3606755127,9.3571811492,9.6533567354,9.6964995637,10.131421744,9.3923170846,9.1471865472,9.260940621,12.038485236,11.165720284,10.229191797,10.039475608,9.4583394276,10.957044507,11.3739546,12.116089039,10.625519727,11.167604867,-1.895824447,-2.958438708,-0.868516285,-0.682294459,0.1950173078,-1.260544943,-1.242532855,-2.723771955,-1.478333179,-1.906664246,0.284373667,0.1908670134,0.1930036188,0.1949412739,0.0975086539,0.1939299913,0.0955794504,0.0939231708,0.0923958237,0.0907935355,-2.559363003,-6.680345469,-12.44873341,-6.628003314,5.9480278875,6.2057597207,24.755077658,14.088475627,22.821768456,15.888868713,-2.274989336,-6.489478456,-12.25572979,-6.43306204,6.0455365414,6.399689712,24.850657109,14.182398798,22.91416428,15.979662248 +050,4,9,53,045,Washington,Mason County,60699,60689,60733,60882,60689,60480,60613,60999,62166,63769,65533,66939,68224,44,149,-193,-209,133,386,1167,1603,1764,1406,1285,160,606,653,683,569,625,640,670,647,627,638,164,623,637,607,643,675,670,708,694,694,738,-4,-17,16,76,-74,-50,-30,-38,-47,-67,-100,19,84,87,65,132,110,169,150,126,149,112,36,84,-284,-342,80,331,1026,1482,1677,1325,1282,55,168,-197,-277,212,441,1195,1632,1803,1474,1394,-7,-2,-12,-8,-5,-5,2,9,8,-1,-9,2332,2332,2430,2510,2501,2522,2324,2498,2535,2783,2618,2588,9.9658759199,10.74269357,11.273510551,9.3977356247,10.278590929,10.392562822,10.640409735,10.007579156,9.4661513376,9.4404533785,10.245446697,10.479472901,10.019064282,10.619936743,11.100878203,10.879714205,11.24389566,10.734559404,10.477685851,10.920148265,-0.279570777,0.2632206694,1.2544462693,-1.222201118,-0.822287274,-0.487151382,-0.603485925,-0.726980248,-1.011534513,-1.479694887,1.3814085434,1.4312623899,1.0728816777,2.1801425351,1.8090320034,2.7442861202,2.382181284,1.9489257707,2.2495319766,1.6572582733,1.3814085434,-4.672166882,-5.645008212,1.3212985061,5.4435417557,16.660577274,23.535951086,25.939273948,20.004227308,18.96968845,2.7628170867,-3.240904492,-4.572126534,3.5014410412,7.2525737592,19.404863395,25.91813237,27.888199718,22.253759285,20.626946724 +050,4,9,53,047,Washington,Okanogan County,41120,41117,41224,41325,41176,41044,41225,41345,41516,41802,42058,42403,42620,107,101,-149,-132,181,120,171,286,256,345,217,148,580,557,489,521,489,504,516,480,477,469,133,406,419,413,423,430,448,444,451,466,530,15,174,138,76,98,59,56,72,29,11,-61,17,83,33,39,91,119,88,48,29,137,112,77,-154,-325,-246,-1,-51,27,167,199,197,168,94,-71,-292,-207,90,68,115,215,228,334,280,-2,-2,5,-1,-7,-7,0,-1,-1,0,-2,640,640,640,640,640,640,640,640,640,640,640,640,14.05225987,13.502866632,11.894916079,12.665767178,11.84449558,12.164950942,12.386279075,11.447650847,11.295153976,11.032308905,9.8365819089,10.157452637,10.046217465,10.283338803,10.415405111,10.813289726,10.657961065,10.756021941,11.034678727,12.467214754,4.215677961,3.345413995,1.8486986135,2.3824283752,1.4290904687,1.3516612158,1.7283180105,0.6916289053,0.2604752489,-1.434905849,2.0109268435,0.7999903031,0.9486742885,2.2122549198,2.8824028097,2.1240390534,1.152212007,0.6916289053,3.2441008276,2.634581231,-3.731117276,-7.878692379,-5.983945512,-0.024310494,-1.23531549,0.6516938005,4.0087376077,4.7460052468,4.6648749127,3.9518718464,-1.720190432,-7.078702076,-5.035271224,2.1879444262,1.6470873198,2.7757328538,5.1609496147,5.4376341522,7.9089757403,6.5864530774 +050,4,9,53,049,Washington,Pacific County,20920,20919,20879,20888,20591,20460,20583,20890,21298,21756,22052,22517,22984,-40,9,-297,-131,123,307,408,458,296,465,467,42,202,208,195,181,195,199,206,175,157,173,84,306,283,307,318,320,301,316,350,327,364,-42,-104,-75,-112,-137,-125,-102,-110,-175,-170,-191,1,-3,16,8,17,20,53,37,28,75,59,5,116,-239,-24,237,407,454,528,441,560,604,6,113,-223,-16,254,427,507,565,469,635,663,-4,0,1,-3,6,5,3,3,2,0,-5,292,292,293,291,292,276,271,287,289,282,267,280,9.6727081188,10.029171388,9.5003775791,8.8200180299,9.4037084368,9.4339622642,9.5693779904,7.9894083272,7.045255671,7.6042284785,14.652716259,13.645459148,14.957004701,15.495943279,15.431726666,14.26946051,14.679240024,15.978816654,14.673876461,15.999648359,-4.98000814,-3.61628776,-5.456627122,-6.675925249,-6.028018229,-4.835498246,-5.109862034,-7.989408327,-7.62862079,-8.395419881,-0.143654081,0.7714747221,0.3897590802,0.8283994835,0.9644829166,2.5125628141,1.718771775,1.2783053324,3.3655679957,2.5933495967,5.5546244643,-11.52390366,-1.169277241,11.548863387,19.627227353,21.522707879,24.527337762,20.133308985,25.129574368,26.548867058,5.4109703833,-10.75242894,-0.77951816,12.377262871,20.591710269,24.035270693,26.246109537,21.411614317,28.495142364,29.142216655 +050,4,9,53,051,Washington,Pend Oreille County,13001,13001,12950,12956,13007,12890,12926,13095,13128,13360,13583,13726,14144,-51,6,51,-117,36,169,33,232,223,143,418,25,117,101,121,106,122,119,123,120,119,119,53,146,129,155,136,139,169,140,175,163,167,-28,-29,-28,-34,-30,-17,-50,-17,-55,-44,-48,1,-2,-1,-3,6,5,1,3,0,-1,1,-23,38,80,-79,61,180,83,245,279,189,469,-22,36,79,-82,67,185,84,248,279,188,470,-1,-1,0,-1,-1,1,-1,1,-1,-1,-4,98,98,98,98,98,98,98,98,98,98,98,98,9.0326565274,7.7803027385,9.3447117427,8.2119615742,9.3770416202,9.076001983,9.2872244035,8.9076940207,8.7150756161,8.5396483674,11.271520111,9.9372183492,11.970498513,10.536101642,10.683678567,12.889448194,10.570824524,12.990387114,11.937456516,11.984212415,-2.238863584,-2.156915611,-2.625786771,-2.324140068,-1.306636947,-3.813446211,-1.283600121,-4.082693093,-3.2223809,-3.444564047,-0.154404385,-0.0770327,-0.231687068,0.4648280136,0.3843049844,0.0762689242,0.2265176684,0,-0.07323593,0.071761751,2.9336833166,6.1626160305,-6.101092791,4.725751472,13.83497944,6.3303207108,18.498942918,20.710388598,13.841590684,33.656261213,2.7792789315,6.0855833301,-6.332779859,5.1905794856,14.219284424,6.4065896351,18.725460586,20.710388598,13.768354755,33.728022964 +050,4,9,53,053,Washington,Pierce County,795225,795220,795402,807728,815772,821307,833106,844317,864004,880745,894951,905719,913890,182,12326,8044,5535,11799,11211,19687,16741,14206,10768,8171,2666,10852,11444,10971,11502,11514,11876,11484,11400,11279,11333,1361,5771,5723,5867,6017,6371,6518,6902,6885,7140,7842,1305,5081,5721,5104,5485,5143,5358,4582,4515,4139,3491,623,1346,2550,1595,2045,2405,1917,1710,1088,1133,925,-1794,5866,-29,-1056,4271,3700,12350,10399,8560,5466,3709,-1171,7212,2521,539,6316,6105,14267,12109,9648,6599,4634,48,33,-198,-108,-2,-37,62,50,43,30,46,17945,17937,21415,21413,20266,20603,19446,20341,20056,20749,20935,20763,13.538515279,14.097936557,13.403140594,13.904629618,13.728200937,13.903710134,13.164071164,12.840035682,12.527559186,12.456522253,7.1996656541,7.0502001848,7.1676443226,7.2738790133,7.5961758006,7.6308843596,7.9117397402,7.7547057604,7.9303814691,8.6194341751,6.3388496254,7.047736372,6.2354962711,6.6307506046,6.1320251362,6.2728257745,5.2523314242,5.0853299213,4.5971777172,3.8370880777,1.6792150356,3.1413612565,1.9485925847,2.4721759319,2.8674937687,2.2443088857,1.9601673364,1.2254349844,1.2584204768,1.0167019398,7.3181838029,-0.035725285,-1.290102677,5.1631605893,4.4115288749,14.45864097,11.920339258,9.6412899505,6.0710735448,4.0766999943,8.9973988385,3.1056359717,0.6584899079,7.6353365212,7.2790226437,16.702949855,13.880506594,10.866724935,7.3294940217,5.0934019342 +050,4,9,53,055,Washington,San Juan County,15769,15768,15783,15807,15806,15867,15970,16155,16256,16674,16991,17352,17492,15,24,-1,61,103,185,101,418,317,361,140,33,84,76,86,95,87,83,88,70,96,93,17,117,138,145,144,148,154,153,125,137,146,16,-33,-62,-59,-49,-61,-71,-65,-55,-41,-53,0,14,10,16,27,25,29,29,27,28,22,1,44,51,104,125,219,143,451,344,375,173,1,58,61,120,152,244,172,480,371,403,195,-2,-1,0,0,0,2,0,3,1,-1,-2,187,187,148,145,144,147,143,133,132,132,132,132,5.3181386515,4.8081485465,5.4304928488,5.9678989855,5.4163424125,5.1217179353,5.3446705132,4.1586217139,5.5906589407,5.3380782918,7.4074074074,8.7305855186,9.1560635241,9.0460784622,9.2140077821,9.5029465305,9.2924385059,7.4261102035,7.9783361966,8.3802089312,-2.089268756,-3.922436972,-3.725570675,-3.078179477,-3.79766537,-4.381228595,-3.947767993,-3.26748849,-2.387677256,-3.042130639,0.8863564419,0.6326511245,1.0103242509,1.6961397117,1.5564202335,1.7895159051,1.7613118737,1.604039804,1.6306088577,1.2627712088,2.7856916746,3.2265207351,6.5671076311,7.8524986651,13.634241245,8.8241646355,27.39143638,20.43665528,21.838511487,9.9299735966,3.6720481165,3.8591718597,7.577431882,9.5486383767,15.190661479,10.613680541,29.152748254,22.040695084,23.469120345,11.192744805 +050,4,9,53,057,Washington,Skagit County,116901,116892,116939,117578,117716,118270,119990,121589,123661,125852,127728,129181,130789,47,639,138,554,1720,1599,2072,2191,1876,1453,1608,376,1481,1446,1425,1488,1384,1500,1501,1391,1394,1406,305,1084,1102,1124,1086,1164,1214,1264,1230,1255,1374,71,397,344,301,402,220,286,237,161,139,32,23,82,43,97,269,277,295,182,118,364,290,-34,167,-232,173,1046,1100,1487,1765,1593,950,1289,-11,249,-189,270,1315,1377,1782,1947,1711,1314,1579,-13,-7,-17,-17,3,2,4,7,4,0,-3,1624,1624,1623,1624,1623,1625,1626,1626,1625,1625,1628,1627,12.630214441,12.291006146,12.076987618,12.490556535,11.457949573,12.232415902,12.03143724,10.970896758,10.852091597,10.816632688,9.2445323793,9.3670046835,9.5259888298,9.1160916646,9.6365992077,9.9001019368,10.131736623,9.7010805269,9.76999638,10.570450437,3.3856820614,2.924001462,2.5509987881,3.3744648703,1.8213503657,2.3323139653,1.8997006168,1.2698162316,1.0820952166,0.2461822518,0.6993096449,0.3655001828,0.8220826659,2.2580374381,2.2932456877,2.4057084608,1.4588418239,0.930672766,2.8336881931,2.2310266569,1.4242037891,-1.972000986,1.4661886722,8.7803240158,9.1067518286,12.126401631,14.147559446,12.564082341,7.3956147897,9.9165288302,2.123513434,-1.606500803,2.2882713381,11.038361454,11.399997516,14.532110092,15.60640127,13.494755107,10.229302983,12.147555487 +050,4,9,53,059,Washington,Skamania County,11066,11070,11115,11156,11205,11316,11387,11386,11590,11815,11920,12096,12107,45,41,49,111,71,-1,204,225,105,176,11,19,101,103,107,104,86,99,87,99,90,86,4,88,86,84,82,80,90,98,84,78,106,15,13,17,23,22,6,9,-11,15,12,-20,2,12,6,2,6,3,5,6,6,19,13,26,16,29,85,44,-9,189,226,85,145,19,28,28,35,87,50,-6,194,232,91,164,32,2,0,-3,1,-1,-1,1,4,-1,0,-1,25,25,25,25,25,25,25,25,25,25,25,25,9.0700911499,9.2124681365,9.5022423516,9.1617847862,7.5528037588,8.6176880223,7.4343089084,8.3421108068,7.4950033311,7.1065570384,7.9026536752,7.6919636868,7.459704276,7.2237149275,7.0258639617,7.8342618384,8.3742790002,7.078154624,6.4956695536,8.7592447217,1.1674374747,1.5205044497,2.0425380756,1.9380698586,0.5269397971,0.7834261838,-0.939970092,1.2639561829,0.9993337775,-1.652687683,1.0776345921,0.5366486293,0.1776120066,0.5285645069,0.2634698986,0.4352367688,0.5127109592,0.5055824731,1.582278481,1.0742469942,1.4368461228,2.5938017083,7.5485102793,3.8761397172,-0.790409696,16.451949861,19.312112796,7.1624183695,12.075283145,1.5700532992,2.5144807148,3.1304503376,7.7261222859,4.4047042241,-0.526939797,16.88718663,19.824823756,7.6680008426,13.657561626,2.6443002934 +050,4,9,53,061,Washington,Snohomish County,713335,713299,715522,722149,732239,744322,757485,770022,787886,803061,814107,822413,830393,2223,6627,10090,12083,13163,12537,17864,15175,11046,8306,7980,2358,8949,8906,9340,9393,9732,10064,9853,9800,9854,9814,976,4718,4706,4863,5017,5153,5309,5540,5582,5806,6318,1382,4231,4200,4477,4376,4579,4755,4313,4218,4048,3496,638,2176,2233,1919,3023,3119,2872,3192,2514,2330,1806,262,241,3672,5633,5708,4851,10193,7639,4291,1894,2627,900,2417,5905,7552,8731,7970,13065,10831,6805,4224,4433,-59,-21,-15,54,56,-12,44,31,23,34,51,10397,10392,10364,10317,10388,10468,9803,9873,9920,10147,10314,10327,12.449301683,12.247075746,12.651018143,12.508930908,12.742331132,12.919890006,12.386333423,12.119952905,12.042627038,11.875561923,6.5633931546,6.4714505345,6.5869273264,6.6812846125,6.7469412579,6.8155500838,6.9644054767,6.9034262365,7.0955442036,7.6451803781,5.8859085284,5.7756252114,6.0640908164,5.8276462954,5.9953898738,6.1043399225,5.4219279461,5.2165266688,4.9470828343,4.2303815451,3.0271181654,3.0707074041,2.5992830638,4.0258168992,4.0837783395,3.6869956377,4.012704383,3.1091389392,2.8475056828,2.1853744481,0.3352644659,5.0495466134,7.6298913489,7.6015093817,6.3515257213,13.085496705,9.6030854579,5.3068079507,2.3146677095,3.1788364757,3.3623826314,8.1202540175,10.229174413,11.627326281,10.435304061,16.772492342,13.615789841,8.4159468899,5.1621733923,5.3642109237 +050,4,9,53,063,Washington,Spokane County,471221,471220,472102,473516,475605,478553,483148,488970,497163,505708,513502,522231,528225,882,1414,2089,2948,4595,5822,8193,8545,7794,8729,5994,1498,5883,5827,6103,5943,5957,6100,6066,5787,5848,5863,907,4136,3997,4400,4099,4447,4598,4488,4808,4833,5147,591,1747,1830,1703,1844,1510,1502,1578,979,1015,716,241,635,840,631,872,852,499,477,321,235,199,111,-959,-477,695,1919,3465,6174,6468,6474,7481,5084,352,-324,363,1326,2791,4317,6673,6945,6795,7716,5283,-61,-9,-104,-81,-40,-5,18,22,20,-2,-5,14692,14689,14540,14477,14541,14624,14507,14986,14623,14320,14260,14257,12.442656548,12.278729477,12.792430604,12.359350775,12.255713813,12.371556372,12.097268741,11.355854044,11.292485612,11.162771216,8.7477184233,8.4225298987,9.2227911939,8.5244790221,9.1490950687,9.3253141311,8.9503036781,9.4347582932,9.3325210262,9.7995537176,3.6949381251,3.8561995783,3.5696394098,3.8348717533,3.1066187438,3.0462422412,3.1469650633,1.9210957506,1.9599645855,1.3632174979,1.3430370403,1.7700588228,1.3226321008,1.8134534538,1.7528736223,1.0120338737,0.951268907,0.6298996281,0.453784904,0.3788830755,-2.028303184,-1.005140546,1.4567817909,3.9908453875,7.1287642035,12.521637548,12.898967066,12.703956986,14.445807945,9.6796058093,-0.685266143,0.764918277,2.7794138916,5.8042988413,8.8816378259,13.533671422,13.850235973,13.333856614,14.899592849,10.058488885 +050,4,9,53,065,Washington,Stevens County,43531,43532,43472,43457,43494,43287,43498,43576,44187,44679,45305,45815,46360,-60,-15,37,-207,211,78,611,492,626,510,545,104,423,456,426,460,430,452,428,433,412,412,134,401,431,420,421,469,486,459,473,469,516,-30,22,25,6,39,-39,-34,-31,-40,-57,-104,19,34,27,25,10,6,7,8,6,3,2,-47,-69,-9,-239,168,116,639,516,661,566,651,-28,-35,18,-214,178,122,646,524,667,569,653,-2,-2,-6,1,-6,-5,-1,-1,-1,-2,-4,266,266,266,266,266,266,266,266,266,266,266,266,9.7320802034,10.48866603,9.8178172641,10.600910296,9.8766566369,10.300468307,9.6324803637,9.6239331437,9.0430201932,8.9395172227,9.2259200037,9.9136295155,9.6795381478,9.7021374662,10.772446425,11.075282294,10.330160016,10.512980085,10.294117647,11.196094386,0.5061601997,0.5750365148,0.1382791164,0.8987728294,-0.895789788,-0.774813988,-0.697679653,-0.889046942,-1.251097454,-2.256577163,0.7822475814,0.621039436,0.576162985,0.2304545716,0.1378138135,0.1595205269,0.1800463619,0.1333570413,0.0658472344,0.0433957147,-1.587502445,-0.207013145,-5.508118136,3.8716368036,2.6644003951,14.561945239,11.612990345,14.691500711,12.423178227,14.125305126,-0.805254863,0.4140262907,-4.931955151,4.1020913752,2.8022142086,14.721465766,11.793036707,14.824857752,12.489025461,14.168700841 +050,4,9,53,067,Washington,Thurston County,252264,252260,253011,256439,258613,261976,265071,268175,273827,280255,285672,289661,294074,751,3428,2174,3363,3095,3104,5652,6428,5417,3989,4413,758,3002,3126,3104,3134,3154,3105,3138,3105,3120,3122,475,1907,1930,2038,1990,2198,2155,2260,2374,2431,2608,283,1095,1196,1066,1144,956,950,878,731,689,514,180,464,825,551,703,714,452,356,196,211,170,295,1864,218,1741,1276,1442,4235,5173,4472,3093,3739,475,2328,1043,2292,1979,2156,4687,5529,4668,3304,3909,-7,5,-65,5,-28,-8,15,21,18,-4,-10,4222,4222,4103,4091,4153,4024,4029,4042,4118,4082,3959,4074,11.785258612,12.138580182,11.924954235,11.892677503,11.82943707,11.457522297,11.326843319,10.973146713,10.845892726,10.696634603,7.4865050545,7.4943889161,7.8295930187,7.551508689,8.2438499304,7.9520001771,8.1576373172,8.3897746529,8.4507580827,8.9355615134,4.2987535578,4.6441912661,4.0953612159,4.3411688142,3.5855871399,3.5055221198,3.169206002,2.5833720604,2.3951346438,1.7610730897,1.8215722838,3.2035600289,2.1168330487,2.667693773,2.6779385124,1.6678905244,1.2850083562,0.6926688424,0.7334882581,0.5824560802,7.317695554,0.8465164682,6.6885777456,4.8420729081,5.4083856231,15.627248608,18.672326479,15.804158487,10.752034039,12.810607553,9.1392678379,4.0500764971,8.8054107943,7.5097666811,8.0863241356,17.295139132,19.957334835,16.496827329,11.485522298,13.393063633 +050,4,9,53,069,Washington,Wahkiakum County,3978,3979,3983,3992,3996,4002,4008,3989,4123,4207,4343,4420,4498,4,9,4,6,6,-19,134,84,136,77,78,9,26,32,40,24,24,24,25,27,28,30,4,46,55,52,47,49,55,45,40,49,58,5,-20,-23,-12,-23,-25,-31,-20,-13,-21,-28,1,6,5,6,12,4,0,0,0,-1,0,-1,23,23,11,16,3,164,104,148,100,108,0,29,28,17,28,7,164,104,148,99,108,-1,0,-1,1,1,-1,1,0,1,-1,-2,48,48,48,44,16,16,16,16,16,16,16,16,6.5203761755,8.012018027,10.002500625,5.9925093633,6.0022508441,5.9171597633,6.0024009604,6.3157894737,6.3905055346,6.7279659116,11.536050157,13.770655984,13.003250813,11.735330836,12.254595473,13.560157791,10.804321729,9.3567251462,11.183384686,13.007400763,-5.015673981,-5.758637957,-3.000750188,-5.742821473,-6.252344629,-7.642998028,-4.801920768,-3.040935673,-4.792879151,-6.279434851,1.5047021944,1.2518778167,1.5003750938,2.9962546816,1.0003751407,0,0,0,-0.228232341,0,5.7680250784,5.7586379569,2.7506876719,3.9950062422,0.7502813555,40.433925049,24.969987995,34.619883041,22.823234052,24.220677282,7.2727272727,7.0105157737,4.2510627657,6.9912609238,1.7506564962,40.433925049,24.969987995,34.619883041,22.595001712,24.220677282 +050,4,9,53,071,Washington,Walla Walla County,58781,58781,58915,59452,59342,59387,59548,59970,60112,60683,60778,61062,61292,134,537,-110,45,161,422,142,571,95,284,230,162,686,685,675,681,683,660,650,612,603,614,122,515,521,556,564,608,595,618,596,554,621,40,171,164,119,117,75,65,32,16,49,-7,19,13,14,24,84,40,81,63,42,100,82,80,351,-295,-88,-27,308,-1,474,39,134,155,99,364,-281,-64,57,348,80,537,81,234,237,-5,2,7,-10,-13,-1,-3,2,-2,1,0,4489,4489,4480,4284,4450,4564,4768,4629,4761,4731,4645,4653,11.591068457,11.532568985,11.370431824,11.451633245,11.429240784,10.992488466,10.762034852,10.077308766,9.8982271832,10.036451608,8.7017496431,8.7714867754,9.3658668059,9.4841720267,10.174199702,9.9098949051,10.232211598,9.8138497131,9.093893631,10.150873694,2.8893188135,2.7610822095,2.0045650178,1.9674612183,1.2550410817,1.0825935611,0.5298232543,0.2634590527,0.8043335522,-0.114422087,0.2196558162,0.2357021398,0.4042820204,1.4125362593,0.6693552436,1.3490781299,1.0430895319,0.6915800133,1.6414970453,1.340373016,5.9307070383,-4.966580804,-1.482367408,-0.454029512,5.1540353754,-0.016655286,7.8480069539,0.642181441,2.1996060407,2.5336319205,6.1503628545,-4.730878664,-1.078085388,0.9585067474,5.823390619,1.3324228444,8.8910964858,1.3337614543,3.841103086,3.8740049365 +050,4,9,53,073,Washington,Whatcom County,201140,201146,201549,203503,204902,206139,208240,211942,216486,221417,225098,228675,231016,403,1954,1399,1237,2101,3702,4544,4931,3681,3577,2341,611,2283,2258,2291,2222,2358,2318,2233,2208,2048,2122,359,1430,1475,1602,1538,1565,1663,1743,1611,1790,1931,252,853,783,689,684,793,655,490,597,258,191,103,349,303,241,557,543,430,459,357,351,289,73,754,347,331,877,2340,3443,3955,2716,2963,1859,176,1103,650,572,1434,2883,3873,4414,3073,3314,2148,-25,-2,-34,-24,-17,26,16,27,11,5,2,5704,5704,5805,5859,5955,5946,5888,5832,5898,5719,5812,5861,11.272626724,11.057651106,11.147306473,10.724481694,11.223707822,10.820954746,10.198605627,9.8899253105,9.0265397016,9.2322886461,7.0608218204,7.2232220467,7.7948428502,7.4231560962,7.4491529861,7.7632647726,7.9606670884,7.2158830051,7.8894072587,8.4012956529,4.2118049041,3.8344290594,3.3524636229,3.3013255981,3.7745548358,3.0576899736,2.2379385389,2.6740423054,1.1371324429,0.8309929931,1.7232355352,1.4838212069,1.1726324138,2.6883601727,2.5845942949,2.0073384559,2.0963546722,1.5990504238,1.5470290211,1.2573663613,3.722978778,1.6992935934,1.6105449335,4.2328399847,11.138030663,16.072712334,18.063361064,12.165324793,13.059393133,8.0880417498,5.4462143132,3.1831148003,2.7831773473,6.9212001573,13.722624958,18.08005079,20.159715736,13.764375217,14.606422154,9.3454081111 +050,4,9,53,075,Washington,Whitman County,44776,44778,44795,45067,46660,46831,46965,48224,48912,49514,49821,50136,49500,17,272,1593,171,134,1259,688,602,307,315,-636,106,441,429,500,418,456,421,432,384,362,348,80,245,230,265,265,284,268,274,288,264,264,26,196,199,235,153,172,153,158,96,98,84,93,358,391,320,474,497,450,504,417,362,275,-106,-285,954,-391,-505,577,85,-58,-207,-148,-994,-13,73,1345,-71,-31,1074,535,446,210,214,-719,4,3,49,7,12,13,0,-2,1,3,-1,5948,5949,5725,6722,6376,6146,6579,6339,6220,6330,6794,6767,9.8150497429,9.3538434703,10.696216748,8.9129600409,9.580938974,8.6682589359,8.7781683701,7.7314139025,7.2431145393,6.9854269541,5.4528054127,5.0148811146,5.6689948765,5.6505607915,5.9670760277,5.5180365673,5.5676345681,5.7985604268,5.2822713767,5.2992894135,4.3622443302,4.3389623557,5.0272218716,3.2623992494,3.6138629463,3.1502223686,3.210533802,1.9328534756,1.9608431626,1.6861375406,7.9677728072,8.5252978948,6.8455787188,10.107040812,10.442383048,9.2653599078,10.241196432,8.3958322847,7.2431145393,5.520093139,-6.343059358,20.80085471,-8.364441497,-10.76804981,12.123249535,1.7501235381,-1.178550383,-4.167715307,-2.961273348,-19.95262756,1.6247134495,29.326152605,-1.518862778,-0.661008998,22.565632584,11.015483446,9.0626460488,4.2281169779,4.2818411917,-14.43253443 +050,4,9,53,077,Washington,Yakima County,243231,243240,244249,245899,246064,246395,246748,247648,249332,249851,250633,251552,251879,1009,1650,165,331,353,900,1684,519,782,919,327,1183,4335,4109,4018,4065,4070,4043,3789,3779,3593,3594,424,1840,1816,1845,1871,1911,1965,2074,2112,2102,2173,759,2495,2293,2173,2194,2159,2078,1715,1667,1491,1421,-65,-130,-265,-53,114,59,313,-21,-140,581,455,332,-710,-1886,-1800,-1972,-1307,-700,-1172,-745,-1158,-1555,267,-840,-2151,-1853,-1858,-1248,-387,-1193,-885,-577,-1100,-17,-5,23,11,17,-11,-7,-3,0,5,6,3485,3485,3500,3475,3485,3482,3496,3489,3499,3507,3504,3468,17.688534892,16.704508266,16.318109731,16.486090242,16.464534503,16.270272446,15.180805436,15.101381862,14.309467626,14.278024198,7.5079363784,7.3826690219,7.4930095703,7.5880626918,7.7306450699,7.9077628878,8.3095778502,8.4398302443,8.3714169081,8.6327619872,10.180598513,9.321839244,8.8251001606,8.8980275498,8.7338894328,8.3625095577,6.8712275859,6.661551618,5.9380507184,5.6452622107,-0.530452027,-1.07731679,-0.215246345,0.4623405381,0.2386750702,1.2596080325,-0.084137481,-0.559458444,2.3138883081,1.8075962744,-2.897084146,-7.667243268,-7.310253239,-7.997680186,-5.287259606,-2.817014769,-4.695672729,-2.97711815,-4.611846232,-6.177609245,-3.427536173,-8.744560058,-7.525499585,-7.535339648,-5.048584535,-1.557406737,-4.77981021,-3.536576594,-2.297957924,-4.370012971 +040,3,5,54,000,West Virginia,West Virginia,1852994,1853008,1854265,1856606,1857446,1854768,1850569,1843332,1832435,1818683,1805953,1795263,1784787,1257,2341,840,-2678,-4199,-7237,-10897,-13752,-12730,-10690,-10476,5100,20469,20687,20938,20575,20089,19342,18952,18589,17839,17571,5227,21901,21496,22249,21654,22757,22458,23139,23625,22767,24297,-127,-1432,-809,-1311,-1079,-2668,-3116,-4187,-5036,-4928,-6726,124,2133,1133,885,1238,1476,1290,592,54,1185,996,1317,1665,662,-2158,-4298,-5989,-9056,-10139,-7734,-6929,-4742,1441,3798,1795,-1273,-3060,-4513,-7766,-9547,-7680,-5744,-3746,-57,-25,-146,-94,-60,-56,-15,-18,-14,-18,-4,49406,49404,49451,49747,49538,48732,48081,47466,47873,46915,46893,46883,11.031911376,11.1398548,11.280599664,11.10560254,10.87684808,10.524062053,10.381477673,10.257029947,9.9072091205,9.8160640215,11.803697838,11.575497597,11.986916703,11.688005706,12.321391396,12.219490517,12.675021733,13.035791732,12.64406245,13.573553442,-0.771786462,-0.435642797,-0.706317039,-0.582403166,-1.444543316,-1.695428464,-2.29354406,-2.778761785,-2.73685333,-3.757489421,1.1495953376,0.6101153134,0.4768044084,0.6682253193,0.7991551479,0.7018943257,0.3242842329,0.0297960954,0.658111038,0.5564168098,0.8973634492,0.3564839695,-1.16264849,-2.319896949,-3.242642399,-4.927406987,-5.553915267,-4.267462995,-3.848144627,-2.649125012,2.0469587868,0.9665992829,-0.685844081,-1.651671629,-2.443487251,-4.225512662,-5.229631034,-4.2376669,-3.190033589,-2.092708202 +050,3,5,54,001,West Virginia,Barbour County,16589,16586,16610,16600,16869,16875,16909,16980,16752,16530,16524,16466,16444,24,-10,269,6,34,71,-228,-222,-6,-58,-22,39,152,193,179,163,171,160,183,159,153,152,31,176,174,216,199,201,190,192,187,203,217,8,-24,19,-37,-36,-30,-30,-9,-28,-50,-65,0,3,-2,-2,-3,-2,1,0,-2,1,2,15,11,242,46,75,103,-200,-211,26,-9,41,15,14,240,44,72,101,-199,-211,24,-8,43,1,0,10,-1,-2,0,1,-2,-2,0,0,469,469,469,765,874,973,1039,939,904,852,853,853,9.1538693165,11.533060444,10.609293504,9.649538243,10.091770191,9.48654097,10.99693528,9.6206208023,9.2755380418,9.2373138864,10.599217103,10.397681437,12.80227596,11.780724603,11.862256189,11.265267402,11.537768163,11.314818176,12.306759624,13.187481009,-1.445347787,1.1353790074,-2.192982456,-2.13118636,-1.770485998,-1.778726432,-0.540832883,-1.694197374,-3.031221582,-3.950167122,0.1806684734,-0.11951358,-0.118539592,-0.177598863,-0.1180324,0.0592908811,0,-0.121014098,0.0606244316,0.1215436038,0.662451069,14.461143147,2.7264106211,4.4399715842,6.0786685945,-11.85817621,-12.67952647,1.5731832759,-0.545619885,2.4916438772,0.8431195423,14.341629568,2.6078710289,4.2623727208,5.9606361946,-11.79888533,-12.67952647,1.4521691777,-0.484995453,2.613187481 +050,3,5,54,003,West Virginia,Berkeley County,104169,104196,104638,105778,107024,108587,110316,111824,113621,115234,117472,119623,122125,442,1140,1246,1563,1729,1508,1797,1613,2238,2151,2502,320,1284,1337,1431,1381,1389,1354,1387,1448,1471,1472,229,837,934,913,913,1009,1028,1043,1093,1096,1177,91,447,403,518,468,380,326,344,355,375,295,8,169,51,19,19,30,33,-22,-59,37,36,320,522,781,1013,1217,1092,1435,1284,1935,1740,2179,328,691,832,1032,1236,1122,1468,1262,1876,1777,2215,23,2,11,13,25,6,3,7,7,-1,-8,910,910,912,888,867,855,898,888,894,939,908,911,12.204395103,12.565671375,13.27390532,12.617460702,12.505627082,12.011798887,12.121212121,12.444887541,12.408528227,12.177970449,7.9556687704,8.7781129877,8.4689556655,8.3415942221,9.0843612136,9.1197409568,9.1149417754,9.3938274045,9.2452392501,9.7374125122,4.2487263326,3.7875583876,4.8049496547,4.2758664797,3.4212658684,2.8920579299,3.0062703459,3.051060136,3.163288977,2.4405579364,1.6063417231,0.4793188034,0.1762433271,0.1735928699,0.270099937,0.2927543303,-0.192261476,-0.5070776,0.3121111791,0.297830799,4.9615998783,7.3401565775,9.396552124,11.119080141,9.831637706,12.730377697,11.221078849,16.630426375,14.677660853,18.027036418,6.5679416014,7.8194753809,9.5727954511,11.29267301,10.101737643,13.023132028,11.028817373,16.123348775,14.989772032,18.324867217 +050,3,5,54,005,West Virginia,Boone County,24629,24624,24607,24411,24356,24091,23716,23252,22803,22368,21907,21352,21055,-17,-196,-55,-265,-375,-464,-449,-435,-461,-555,-297,71,305,271,266,262,230,233,243,232,193,188,65,359,304,282,334,343,329,316,318,324,323,6,-54,-33,-16,-72,-113,-96,-73,-86,-131,-135,0,-3,-2,-1,0,0,0,-2,-2,-2,-2,-25,-139,-16,-252,-310,-354,-353,-362,-374,-421,-160,-25,-142,-18,-253,-310,-354,-353,-364,-376,-423,-162,2,0,-4,4,7,3,0,2,1,-1,0,131,131,131,131,133,146,134,131,135,132,133,133,12.444408177,11.114073041,10.981072099,10.960737967,9.7939022313,10.118336771,10.759115362,10.479954828,8.9229986824,8.8664607258,14.647680444,12.467447249,11.641587714,13.972849164,14.60568898,14.287265226,13.99127759,14.364765669,14.979541829,15.233334119,-2.203272267,-1.353374208,-0.660515615,-3.012111197,-4.811786748,-4.168928455,-3.232162228,-3.884810841,-6.056543147,-6.366873394,-0.122404015,-0.082022679,-0.041282226,0,0,0,-0.08855239,-0.090344438,-0.092466308,-0.09432405,-5.671386021,-0.656181434,-10.40312094,-12.9688121,-15.074093,-15.32949734,-16.02798256,-16.89440994,-19.46415775,-7.545924022,-5.793790036,-0.738204113,-10.44440316,-12.9688121,-15.074093,-15.32949734,-16.11653494,-16.98475438,-19.55662406,-7.640248072 +050,3,5,54,007,West Virginia,Braxton County,14523,14519,14544,14535,14452,14387,14407,14378,14316,14218,14030,13894,13702,25,-9,-83,-65,20,-29,-62,-98,-188,-136,-192,34,171,152,168,153,177,132,132,124,113,111,19,162,175,184,183,169,193,178,193,176,191,15,9,-23,-16,-30,8,-61,-46,-69,-63,-80,1,5,3,-2,-1,2,-1,0,1,5,5,9,-22,-61,-44,53,-37,1,-52,-119,-78,-116,10,-17,-58,-46,52,-35,0,-52,-118,-73,-111,0,-1,-2,-3,-2,-2,-1,0,-1,0,-1,335,335,335,365,335,335,373,359,395,382,380,383,11.761064686,10.487459896,11.650889421,10.627214003,12.298071912,9.2005297275,9.2521202776,8.7793826112,8.0933963616,8.0446441513,11.142061281,12.07437817,12.760497937,12.710981454,11.742226854,13.452289677,12.476344011,13.664684225,12.605643891,13.842585882,0.6190034045,-1.586918274,-1.109608516,-2.083767452,0.5558450582,-4.25175995,-3.224223733,-4.885301614,-4.512247529,-5.797941731,0.3438907803,0.20698934,-0.138701065,-0.069458915,0.1389612645,-0.069700983,0,0.0708014727,0.3581148833,0.3623713582,-1.513119433,-4.208783248,-3.05142342,3.6813224977,-2.570783394,0.0697009828,-3.644774655,-8.425375248,-5.586592179,-8.407015509,-1.169228653,-4.001793908,-3.190124484,3.6118635827,-2.43182213,0,-3.644774655,-8.354573775,-5.228477296,-8.044644151 +050,3,5,54,009,West Virginia,Brooke County,24069,24046,23973,23814,23677,23596,23383,23213,22674,22406,22130,21924,21674,-73,-159,-137,-81,-213,-170,-539,-268,-276,-206,-250,56,192,166,203,182,211,182,226,171,191,178,108,365,326,328,302,342,367,342,295,301,326,-52,-173,-160,-125,-120,-131,-185,-116,-124,-110,-148,1,2,-1,-1,3,3,-3,-2,-6,-1,1,-21,14,29,49,-91,-40,-352,-149,-145,-95,-102,-20,16,28,48,-88,-37,-355,-151,-151,-96,-101,-1,-2,-5,-4,-5,-2,1,-1,-1,0,-1,872,872,872,872,872,873,851,750,726,672,673,673,8.0356582334,6.9907982565,8.5884119899,7.7481427872,9.0565713795,7.9325299104,10.026619343,7.6791808874,8.6711762837,8.1655121795,15.276121121,13.728917058,13.876843018,12.856808361,14.67937162,15.995815808,15.173025732,13.247709718,13.665047442,14.954814441,-7.240462887,-6.738118801,-5.288431028,-5.108665574,-5.62280024,-8.063285898,-5.146406389,-5.568528831,-4.993871158,-6.789302262,0.0837047733,-0.042113243,-0.042307448,0.1277166393,0.1287664177,-0.130755988,-0.088731145,-0.269444943,-0.045398829,0.0458736639,0.5859334129,1.2212840328,2.0730649631,-3.874071394,-1.71688557,-15.34203587,-6.610470275,-6.511586133,-4.312888727,-4.679113721,0.6696381861,1.1791707903,2.0307575149,-3.746354754,-1.588119152,-15.47279186,-6.69920142,-6.781031076,-4.358287556,-4.633240057 +050,3,5,54,011,West Virginia,Cabell County,96319,96246,96282,96584,96933,97030,96659,96617,95708,94511,92935,91897,91589,36,302,349,97,-371,-42,-909,-1197,-1576,-1038,-308,301,1135,1221,1218,1144,1128,1046,1048,1046,1027,1013,296,1158,1082,1200,1207,1293,1220,1345,1371,1159,1177,5,-23,139,18,-63,-165,-174,-297,-325,-132,-164,20,221,133,68,75,84,54,23,-5,65,48,21,107,100,17,-367,50,-788,-920,-1251,-968,-196,41,328,233,85,-292,134,-734,-897,-1256,-903,-148,-10,-3,-23,-6,-16,-11,-1,-3,5,-3,4,3936,3936,3936,3924,3916,3901,4132,4078,3929,3812,3808,3808,11.76982983,12.619046389,12.559096322,11.812751369,11.672426996,10.877421032,11.01887824,11.160547571,11.112794321,11.041714354,12.008337395,11.182480092,12.373493914,12.463278761,13.379829881,12.686858183,14.141594688,14.628212925,12.541118421,12.829316678,-0.238507565,1.4365662965,0.1856024087,-0.650527392,-1.707402885,-1.809437151,-3.122716448,-3.467665354,-1.4283241,-1.787602324,2.2917466013,1.3745562405,0.7011646551,0.7744373712,0.8692232869,0.5615494605,0.2418265263,-0.053348698,0.7033414127,0.5232006802,1.1095786712,1.0335009327,0.1752911638,-3.789580203,0.5173948136,-8.194462498,-9.673061051,-13.34784418,-10.47437673,-2.136402777,3.4013252725,2.4080571733,0.8764558189,-3.015142832,1.3866181005,-7.632913038,-9.431234524,-13.40119288,-9.771035319,-1.613202097 +050,3,5,54,013,West Virginia,Calhoun County,7627,7629,7658,7642,7604,7557,7565,7472,7387,7321,7197,7077,6945,29,-16,-38,-47,8,-93,-85,-66,-124,-120,-132,23,88,78,81,69,62,73,69,51,51,49,15,93,101,97,94,90,80,95,105,95,94,8,-5,-23,-16,-25,-28,-7,-26,-54,-44,-45,0,0,0,0,0,-1,-2,-2,-2,-2,0,21,-10,-14,-32,34,-64,-77,-37,-67,-73,-87,21,-10,-14,-32,34,-65,-79,-39,-69,-75,-87,0,-1,-1,1,-1,0,1,-1,-1,-1,0,22,22,22,22,22,22,22,22,22,22,22,22,11.503267974,10.23219205,10.685310995,9.1257770136,8.2463257299,9.8256948651,9.3826488986,7.0257611241,7.1458596049,6.9890172586,12.156862745,13.249376886,12.79598971,12.432217961,11.970472834,10.767884784,12.918139788,14.464802314,13.31091495,13.407502496,-0.653594771,-3.017184835,-2.110678715,-3.306440947,-3.724147104,-0.942189919,-3.535490889,-7.43904119,-6.165055345,-6.418485237,0,0,0,0,-0.133005254,-0.26919712,-0.271960838,-0.275520044,-0.280229788,0,-1.307189542,-1.836547291,-4.22135743,4.4967596879,-8.512336237,-10.3640891,-5.031275496,-9.229921477,-10.22838728,-12.40907146,-1.307189542,-1.836547291,-4.22135743,4.4967596879,-8.645341491,-10.63328622,-5.303236334,-9.505441521,-10.50861707,-12.40907146 +050,3,5,54,015,West Virginia,Clay County,9386,9394,9382,9344,9217,9150,8892,8886,8842,8704,8604,8506,8341,-12,-38,-127,-67,-258,-6,-44,-138,-100,-98,-165,39,121,111,112,95,114,99,75,95,90,86,32,101,108,107,109,117,110,134,131,100,115,7,20,3,5,-14,-3,-11,-59,-36,-10,-29,0,-2,-2,-1,0,0,0,0,0,0,0,-19,-56,-132,-72,-250,-2,-33,-80,-63,-88,-135,-19,-58,-134,-73,-250,-2,-33,-80,-63,-88,-135,0,0,4,1,6,-1,0,1,-1,0,-1,74,74,74,74,74,74,74,74,74,74,74,74,12.923208373,11.96056247,12.19578592,10.530983261,12.82483969,11.168772563,8.5489570272,10.977582621,10.520163647,10.209532855,10.787140874,11.637304025,11.651331192,12.082917637,13.162335471,12.409747292,15.274136555,15.137508667,11.689070719,13.652282305,2.1360674997,0.3232584451,0.5444547286,-1.551934375,-0.337495781,-1.240974729,-6.725179528,-4.159926046,-1.168907072,-3.442749451,-0.21360675,-0.21550563,-0.108890946,0,0,0,0,0,0,0,-5.980988999,-14.22337159,-7.840148092,-27.71311385,-0.224997188,-3.722924188,-9.118887496,-7.27987058,-10.28638223,-16.02659227,-6.194595749,-14.43887722,-7.949039037,-27.71311385,-0.224997188,-3.722924188,-9.118887496,-7.27987058,-10.28638223,-16.02659227 +050,3,5,54,017,West Virginia,Doddridge County,8202,8201,8198,8253,8300,8551,8471,8706,8577,8530,8568,8451,8368,-3,55,47,251,-80,235,-129,-47,38,-117,-83,18,68,65,66,69,69,72,70,68,64,62,28,77,86,84,80,90,84,85,80,91,104,-10,-9,-21,-18,-11,-21,-12,-15,-12,-27,-42,0,1,0,-2,-2,1,3,2,1,3,3,8,63,68,262,-68,250,-121,-34,49,-91,-46,8,64,68,260,-70,251,-118,-32,50,-88,-43,-1,0,0,9,1,5,1,0,0,-2,2,722,722,722,787,859,761,991,932,929,1095,1095,1096,8.266974652,7.853561288,7.8333630052,8.1071554459,8.0339989521,8.3318868252,8.1837844157,7.9541466838,7.5210059345,7.3726143053,9.3611330618,10.390865704,9.9697347338,9.399600517,10.479129068,9.7205346294,9.9374525048,9.357819628,10.693930313,12.366965931,-1.09415841,-2.537304416,-2.136371729,-1.292445071,-2.445130116,-1.388647804,-1.753668089,-1.403672944,-3.172924379,-4.994351626,0.1215731566,0,-0.237374637,-0.234990013,0.1164347674,0.3471619511,0.2338224119,0.1169727454,0.3525471532,0.3567394019,7.6591088688,8.2160333474,31.096077384,-7.989660439,29.108691855,-14.00219869,-3.974981002,5.7316645222,-10.69393031,-5.470004162,7.7806820254,8.2160333474,30.858702748,-8.224650452,29.225126623,-13.65503674,-3.74115859,5.8486372675,-10.34138316,-5.11326476 +050,3,5,54,019,West Virginia,Fayette County,46039,46045,46029,45924,45873,45570,45176,44726,44184,43620,43067,42500,42062,-16,-105,-51,-303,-394,-450,-542,-564,-553,-567,-438,144,565,554,576,548,502,461,444,439,400,396,183,641,618,669,644,677,612,657,641,664,712,-39,-76,-64,-93,-96,-175,-151,-213,-202,-264,-316,2,23,8,9,13,26,25,12,4,22,20,25,-50,15,-215,-310,-298,-415,-363,-356,-325,-143,27,-27,23,-206,-297,-272,-390,-351,-352,-303,-123,-4,-2,-10,-4,-1,-3,-1,0,1,0,1,1840,1840,1840,1840,1835,1843,1832,1814,1836,1818,1818,1817,12.288886714,12.070111224,12.598011876,12.077667335,11.167715957,10.370037116,10.113434468,10.128392954,9.3493987168,9.3659090372,13.941905104,13.464492304,14.632065877,14.193463073,15.06084403,13.766730402,14.965149651,14.788838003,15.52000187,16.839715239,-1.65301839,-1.39438108,-2.034054001,-2.115795738,-3.893128073,-3.396693285,-4.851715184,-4.660445049,-6.170603153,-7.473806201,0.5002555653,0.174297635,0.1968439356,0.2865140061,0.5784075994,0.562366438,0.2733360667,0.0922860406,0.5142169294,0.4730257089,-1.087512099,0.3268080656,-4.702382905,-6.832257069,-6.629440947,-9.33528287,-8.268416017,-8.213457612,-7.596386457,-3.382133819,-0.587256533,0.5011057006,-4.50553897,-6.545743063,-6.051033347,-8.772916432,-7.995079951,-8.121171571,-7.082169528,-2.90910811 +050,3,5,54,021,West Virginia,Gilmer County,8693,8695,8731,8754,8760,8635,8511,8315,8153,8060,7937,7888,7811,36,23,6,-125,-124,-196,-162,-93,-123,-49,-77,22,73,67,68,71,55,63,67,53,64,60,6,63,86,80,79,74,87,81,85,80,80,16,10,-19,-12,-8,-19,-24,-14,-32,-16,-20,0,18,-2,-2,0,6,6,5,2,14,8,19,-3,25,-113,-118,-187,-147,-84,-92,-48,-64,19,15,23,-115,-118,-181,-141,-79,-90,-34,-56,1,-2,2,2,2,4,3,0,-1,1,-1,2239,2239,2239,2249,2179,2096,1925,1842,1858,1766,1766,1759,8.350014298,7.6510220395,7.818338603,8.2818150006,6.5375014858,7.6512023318,8.2649725529,6.6262424205,8.0884676145,7.6437989681,7.2061767229,9.8207148567,9.1980454153,9.2149772542,8.79591109,10.565946077,9.991981743,10.626992561,10.110584518,10.191731957,1.1438375751,-2.169692817,-1.379706812,-0.933162254,-2.258409604,-2.914743745,-1.72700919,-4.000750141,-2.022116904,-2.547932989,2.0589076351,-0.228388718,-0.229951135,0,0.7131819803,0.7286859364,0.6167889965,0.2500468838,1.7693522907,1.0191731957,-0.343151273,2.85485897,-12.99223915,-13.76414324,-22.22750505,-17.85280544,-10.36205514,-11.50215665,-6.066350711,-8.153385566,1.7157563626,2.6264702524,-13.22219028,-13.76414324,-21.51432307,-17.1241195,-9.745266144,-11.25210977,-4.29699842,-7.13421237 +050,3,5,54,023,West Virginia,Grant County,11937,11920,11892,11881,11801,11737,11614,11648,11594,11625,11610,11486,11510,-28,-11,-80,-64,-123,34,-54,31,-15,-124,24,39,119,116,110,110,135,119,131,129,104,107,48,125,125,140,130,138,145,126,121,140,140,-9,-6,-9,-30,-20,-3,-26,5,8,-36,-33,0,3,2,-1,-1,-1,-1,0,0,0,0,-17,-9,-73,-31,-105,40,-26,27,-22,-88,58,-17,-6,-71,-32,-106,39,-27,27,-22,-88,58,-2,1,0,-2,3,-2,-1,-1,-1,0,-1,126,126,126,126,126,126,126,126,126,126,126,126,10.011357422,9.7964698927,9.3465884952,9.421438054,11.606912561,10.240082609,11.283862354,11.103938025,9.0058884655,9.305966255,10.516131746,10.556540833,11.895658085,11.134426791,11.864843952,12.477411582,10.853180585,10.415321713,12.123311396,12.176030614,-0.504774324,-0.76007094,-2.54906959,-1.712988737,-0.25793139,-2.237328973,0.4306817692,0.6886163116,-3.11742293,-2.870064359,0.2523871619,0.1689046533,-0.084968986,-0.085649437,-0.08597713,-0.086051114,0,0,0,0,-0.757161486,-6.165019846,-2.634038576,-8.99319087,3.4390852033,-2.237328973,2.3256815539,-1.893694857,-7.620367163,5.0443555401,-0.504774324,-5.996115193,-2.719007562,-9.078840307,3.3531080733,-2.323380088,2.3256815539,-1.893694857,-7.620367163,5.0443555401 +050,3,5,54,025,West Virginia,Greenbrier County,35480,35487,35554,35743,35892,35823,35602,35603,35538,35206,34767,34634,34319,67,189,149,-69,-221,1,-65,-332,-439,-133,-315,105,336,389,387,361,355,341,353,342,310,300,88,515,490,441,466,476,478,517,476,503,532,17,-179,-101,-54,-105,-121,-137,-164,-134,-193,-232,1,38,25,20,104,85,77,17,12,22,21,49,328,226,-29,-218,42,-4,-183,-317,39,-103,50,366,251,-9,-114,127,73,-166,-305,61,-82,0,2,-1,-6,-2,-5,-1,-2,0,-1,-1,616,616,616,616,616,613,616,612,611,610,610,611,9.4253615159,10.860612829,10.792721188,10.108505425,9.9712098869,9.586595634,9.9796449169,9.7751990053,8.9335888532,8.7015793366,14.446610657,13.680463461,12.298682284,13.048652433,13.369847623,13.438101798,14.616080516,13.605247738,14.495468365,15.43080069,-5.021249141,-2.819850632,-1.505961096,-2.940147007,-3.398637736,-3.851506164,-4.636435599,-3.830048733,-5.561879512,-6.729221354,1.0659635048,0.6979828296,0.5577633689,2.9121456073,2.3874727898,2.1647151432,0.4806061291,0.3429894388,0.6339966283,0.6091105536,9.2009481465,6.3097647798,-0.808756885,-6.104305215,1.1796924373,-0.112452735,-5.173583625,-9.060637675,1.1239031138,-2.987542239,10.266911651,7.0077476094,-0.250993516,-3.192159608,3.5671652272,2.0522624085,-4.692977496,-8.717648236,1.7578997421,-2.378431685 +050,3,5,54,027,West Virginia,Hampshire County,23964,23952,23945,23775,23668,23479,23430,23314,23338,23398,23380,23213,23190,-7,-170,-107,-189,-49,-116,24,60,-18,-167,-23,65,199,229,222,243,229,235,178,227,233,217,81,254,256,262,256,253,258,294,259,273,287,-16,-55,-27,-40,-13,-24,-23,-116,-32,-40,-70,0,-5,-6,-5,-4,-4,-4,-3,-3,-3,-2,11,-111,-70,-143,-30,-86,52,178,19,-125,49,11,-116,-76,-148,-34,-90,48,175,16,-128,47,-2,1,-4,-1,-2,-2,-1,1,-2,1,0,508,508,508,488,518,481,406,415,439,417,417,418,8.3403185247,9.6536896908,9.4173542325,10.360485195,9.7980489475,10.074594873,7.6172543649,9.7054170764,10.001502372,9.3528435661,10.645431685,10.791897646,11.114174815,10.914749835,10.824918706,11.060619052,12.581307771,11.073581598,11.718498487,12.369889878,-2.30511316,-1.138207955,-1.696820582,-0.55426464,-1.026869759,-0.986024179,-4.964053406,-1.368164522,-1.716996115,-3.017046312,-0.209555742,-0.252935101,-0.212102573,-0.170542966,-0.17114496,-0.171482466,-0.128380692,-0.128265424,-0.128774709,-0.086201323,-4.652137469,-2.950909512,-6.066133582,-1.279072246,-3.679616635,2.2292720569,7.6172543649,0.8123476848,-5.36561286,2.1119324182,-4.86169321,-3.203844614,-6.278236155,-1.449615212,-3.850761595,2.057789591,7.4888736734,0.6840822609,-5.494387569,2.025731095 +050,3,5,54,029,West Virginia,Hancock County,30676,30691,30686,30644,30480,30408,30293,30014,29679,29411,29096,28834,28571,-5,-42,-164,-72,-115,-279,-335,-268,-315,-262,-263,71,306,294,293,272,290,229,224,267,244,245,75,378,412,387,404,438,367,455,430,452,466,-4,-72,-118,-94,-132,-148,-138,-231,-163,-208,-221,0,15,15,13,30,15,-6,-8,-10,-7,-3,4,18,-56,15,-7,-142,-191,-27,-141,-46,-40,4,33,-41,28,23,-127,-197,-35,-151,-53,-43,-5,-3,-5,-6,-6,-4,0,-2,-1,-1,1,226,226,226,226,226,226,226,226,226,226,226,226,9.9788031958,9.6197892808,9.6242280909,8.961961088,9.6174573433,7.6725914261,7.5816551024,9.127112995,8.4239599517,8.5358418256,12.326756889,13.480793142,12.711864407,13.311148087,14.525676953,12.296249141,15.400236927,14.699095835,15.605040566,16.235519554,-2.347953693,-3.861003861,-3.087636316,-4.349186999,-4.90821961,-4.623657715,-7.818581824,-5.57198284,-7.181080615,-7.699677728,0.4891570194,0.4908055756,0.427013533,0.9884515906,0.4974546902,-0.201028596,-0.270773397,-0.341839438,-0.241670982,-0.104520512,0.5869884233,-1.832340815,0.4927079227,-0.230638704,-4.709237734,-6.399410316,-0.913860213,-4.819936076,-1.588123597,-1.393606829,1.0761454427,-1.34153524,0.9197214558,0.7578128861,-4.211783043,-6.600438912,-1.18463361,-5.161775514,-1.82979458,-1.498127341 +050,3,5,54,031,West Virginia,Hardy County,14025,14027,14044,13967,13857,13977,13964,13833,13837,13859,13789,13825,13633,17,-77,-110,120,-13,-131,4,22,-70,36,-192,38,154,135,140,154,135,175,162,157,163,162,56,136,134,139,137,166,178,145,164,159,181,-18,18,1,1,17,-31,-3,17,-7,4,-19,2,36,37,44,39,59,62,33,25,36,37,31,-132,-148,76,-68,-160,-55,-27,-89,-2,-209,33,-96,-111,120,-29,-101,7,6,-64,34,-172,2,1,0,-1,-1,1,0,-1,1,-2,-1,58,58,58,58,58,58,58,58,58,58,58,58,10.995680268,9.703852789,10.05963929,11.023227515,9.7132784113,12.649078424,11.698440208,11.357060185,11.805605852,11.799839755,9.7104708864,9.6319723979,9.9877847237,9.8063777245,11.943734935,12.865919769,10.470826112,11.863425926,11.515897733,13.183771578,1.285209382,0.071880391,0.0718545664,1.2168497906,-2.230456524,-0.216841344,1.2276140959,-0.506365741,0.2897081191,-1.383931823,2.5704187641,2.6595744681,3.1616009197,2.7915965785,4.2450624168,4.4813877846,2.3830155979,1.8084490741,2.6073730716,2.6950251293,-9.424868802,-10.63829787,5.4609470432,-4.867399163,-11.51203367,-3.975424648,-1.949740035,-6.438078704,-0.14485406,-15.22325005,-6.854450037,-7.978723404,8.6225479629,-2.075802584,-7.266971256,0.505963137,0.4332755633,-4.62962963,2.4625190121,-12.52822493 +050,3,5,54,033,West Virginia,Harrison County,69099,69089,69244,69309,69113,68935,68702,68573,68392,67951,67547,67339,66870,155,65,-196,-178,-233,-129,-181,-441,-404,-208,-469,209,800,821,794,823,807,770,688,724,735,705,160,903,884,868,805,849,843,871,889,882,943,49,-103,-63,-74,18,-42,-73,-183,-165,-147,-238,2,14,13,1,4,9,12,7,-1,17,13,105,156,-130,-93,-248,-88,-116,-261,-238,-79,-244,107,170,-117,-92,-244,-79,-104,-254,-239,-62,-231,-1,-2,-16,-12,-7,-8,-4,-4,0,1,0,885,885,885,867,844,841,840,817,911,881,884,884,11.547927508,11.862276228,11.503245248,11.958993585,11.757421235,11.243748403,10.092193952,10.686504598,10.898091722,10.506001833,13.034723175,12.772536158,12.575336115,11.697436009,12.369331634,12.309714161,12.776600192,13.1219649,13.077710066,14.052708835,-1.486795667,-0.91025993,-1.072090867,0.2615575754,-0.611910399,-1.065965758,-2.68440624,-2.435460302,-2.179618344,-3.546707002,0.2020887314,0.1878314141,0.0144877144,0.0581239056,0.1311236569,0.1752272478,0.1026822059,-0.014760365,0.2520647065,0.1937276934,2.251845864,-1.878314141,-1.347357441,-3.603682149,-1.282097979,-1.693863396,-3.828579392,-3.512966981,-1.171359518,-3.636119783,2.4539345954,-1.690482727,-1.332869726,-3.545558244,-1.150974322,-1.518636148,-3.725897186,-3.527727347,-0.919294812,-3.44239209 +050,3,5,54,035,West Virginia,Jackson County,29211,29215,29233,29320,29285,29200,29139,29179,29192,28919,28741,28661,28453,18,87,-35,-85,-61,40,13,-273,-178,-80,-208,92,319,319,335,314,348,314,301,300,309,303,107,321,337,333,344,357,336,387,370,382,397,-15,-2,-18,2,-30,-9,-22,-86,-70,-73,-94,2,18,11,0,11,20,16,6,1,25,20,33,74,-23,-85,-37,32,20,-191,-110,-31,-133,35,92,-12,-85,-26,52,36,-185,-109,-6,-113,-2,-3,-5,-2,-5,-3,-1,-2,1,-1,-1,180,180,180,180,180,180,180,180,180,180,180,180,10.896111215,10.886443136,11.455928871,10.764668575,11.934565657,10.758767196,10.359484435,10.405827263,10.766175395,10.610358231,10.964425392,11.500725194,11.387535265,11.793140095,12.243218217,11.512566172,13.319337131,12.833853625,13.309640779,13.90202052,-0.068314177,-0.614282058,0.0683936052,-1.02847152,-0.30865256,-0.753798976,-2.959852696,-2.428026361,-2.543465384,-3.291662289,0.6148275921,0.3753945909,0,0.377106224,0.685894578,0.5482174367,0.2065013509,0.0346860909,0.8710497892,0.7003536786,2.5276245453,-0.784915963,-2.906728221,-1.268448208,1.0974313248,0.6852717959,-6.573626336,-3.815469997,-1.080101739,-4.657351963,3.1424521374,-0.409521372,-2.906728221,-0.891341984,1.7833259028,1.2334892327,-6.367124985,-3.780783906,-0.209051949,-3.956998284 +050,3,5,54,037,West Virginia,Jefferson County,53498,53490,53612,54483,54736,55054,55702,56164,56112,56586,57078,57347,57486,122,871,253,318,648,462,-52,474,492,269,139,150,617,601,584,631,556,568,593,581,495,520,131,414,426,442,444,458,451,530,520,512,576,19,203,175,142,187,98,117,63,61,-17,-56,17,274,122,62,53,35,47,23,-6,58,55,82,393,-34,119,410,335,-217,392,438,228,137,99,667,88,181,463,370,-170,415,432,286,192,4,1,-10,-5,-2,-6,1,-4,-1,0,3,1391,1391,1391,1372,1324,1289,1217,1049,1051,1076,1077,1078,11.415884176,11.005411146,10.638491666,11.394416555,9.9404644843,10.117923688,10.523700509,10.223113739,8.6519554293,9.0566300628,7.6599287664,7.8008405131,8.0517351307,8.0176243274,8.1883682263,8.0337739143,9.4056682461,9.1497747748,8.9490932925,10.031959454,3.7559554096,3.2045706333,2.5867565352,3.376792228,1.752096258,2.0841497738,1.1180322632,1.073338964,-0.297137863,-0.975329391,5.0696146908,2.2340435272,1.1294289097,0.9570587598,0.6257486636,0.8372225587,0.4081705088,-0.105574324,1.0137644745,0.9579127951,7.271381655,-0.622602294,2.1677748429,7.4036621041,5.9893086371,-3.865474367,6.9566451933,7.7069256757,3.9851431068,2.3860736896,12.340996346,1.6114412328,3.2972037526,8.3607208639,6.6150573007,-3.028251808,7.3648157021,7.6013513514,4.9989075814,3.3439864847 +050,3,5,54,039,West Virginia,Kanawha County,193063,193056,192925,192216,192306,191625,190458,188399,186400,183525,180497,178393,176253,-131,-709,90,-681,-1167,-2059,-1999,-2875,-3028,-2104,-2140,508,2095,2262,2223,2221,2038,2096,1902,1878,1845,1790,578,2463,2312,2480,2456,2544,2441,2546,2726,2508,2633,-70,-368,-50,-257,-235,-506,-345,-644,-848,-663,-843,4,130,147,96,149,154,116,77,10,157,118,-39,-463,40,-488,-1068,-1709,-1768,-2311,-2191,-1596,-1413,-35,-333,187,-392,-919,-1555,-1652,-2234,-2181,-1439,-1295,-26,-8,-47,-32,-13,2,-2,3,1,-2,-2,3163,3161,3160,3125,3179,3135,3171,3202,3339,3306,3308,3305,10.879132577,11.765256604,11.580205818,11.625746238,10.758676757,11.184661645,10.283165507,10.3180577,10.281701914,10.09457318,12.790121021,12.025319748,12.918988047,12.855845458,13.429869317,13.025648414,13.764952355,14.977116768,13.976427318,14.848609599,-1.910988443,-0.260063143,-1.338782229,-1.230099219,-2.671192561,-1.840986769,-3.481786849,-4.659059068,-3.694725403,-4.754036419,0.6750774392,0.7645856414,0.5000898599,0.7799352497,0.8129716489,0.6189984498,0.4163006015,0.0549417343,0.8749198919,0.6654523102,-2.404314264,0.2080505147,-2.542123454,-5.590408367,-9.021873688,-9.434390166,-12.49442455,-12.03773398,-8.894090111,-7.968509443,-1.729236825,0.9726361561,-2.042033595,-4.810473117,-8.20890204,-8.815391717,-12.07812394,-11.98279225,-8.019170219,-7.303057133 +050,3,5,54,041,West Virginia,Lewis County,16372,16369,16411,16436,16450,16477,16445,16436,16290,16166,15981,15877,15805,42,25,14,27,-32,-9,-146,-124,-185,-104,-72,57,200,185,195,220,188,206,169,163,171,168,28,215,203,232,226,225,246,248,234,232,243,29,-15,-18,-37,-6,-37,-40,-79,-71,-61,-75,0,0,-1,1,15,16,12,-1,-1,-1,-1,15,42,35,64,-38,14,-117,-43,-112,-42,2,15,42,34,65,-23,30,-105,-44,-113,-43,1,-2,-2,-2,-1,-3,-2,-1,-1,-1,0,2,248,248,248,248,248,248,248,247,248,248,247,247,12.177672238,11.250988262,11.844383029,13.364923152,11.435175329,12.589378476,10.414099088,10.140915171,10.735137171,10.605391074,13.090997656,12.345679012,14.091778783,13.729421056,13.685715155,15.033917986,15.282228247,14.55812362,14.564630548,15.33994066,-0.913325418,-1.09469075,-2.247395754,-0.364497904,-2.250539825,-2.44453951,-4.868129159,-4.417208449,-3.829493377,-4.734549587,0,-0.060816153,0.0607404258,0.9112447603,0.973206411,0.733361853,-0.061621888,-0.062214204,-0.06277858,-0.063127328,2.55731117,2.128565347,3.8873872506,-2.308486726,0.8515556096,-7.150278066,-2.649741188,-6.967990792,-2.636700358,0.1262546556,2.55731117,2.0677491942,3.9481276764,-1.397241966,1.8247620206,-6.416916213,-2.711363076,-7.030204996,-2.699478938,0.0631273278 +050,3,5,54,043,West Virginia,Lincoln County,21720,21711,21674,21569,21606,21454,21523,21284,21107,20895,20586,20453,20043,-37,-105,37,-152,69,-239,-177,-212,-309,-133,-410,61,289,250,288,295,227,228,252,209,231,214,96,287,251,268,253,246,276,279,305,299,331,-35,2,-1,20,42,-19,-48,-27,-96,-68,-117,0,1,1,-2,-4,-5,-1,5,2,11,8,1,-107,41,-172,37,-218,-127,-189,-215,-76,-299,1,-106,42,-174,33,-223,-128,-184,-213,-65,-291,-3,-1,-4,2,-6,3,-1,-1,0,0,-2,65,65,65,65,65,65,65,65,65,65,65,65,13.366325186,11.580775912,13.376683697,13.728273262,10.605742052,10.757000307,11.999428599,10.076902678,11.257584249,10.568945081,13.273824665,11.627099016,12.447747329,11.773739442,11.493447333,13.02163195,13.285081663,14.705527832,14.571505154,16.34729356,0.0925005203,-0.046323104,0.9289363679,1.9545338204,-0.887705282,-2.264631644,-1.285653064,-4.628625154,-3.313920905,-5.778348479,0.0462502602,0.0463231036,-0.092893637,-0.186146078,-0.233606653,-0.047179826,0.2380839008,0.0964296907,0.5360754404,0.3951007507,-4.948777837,1.8992472496,-7.988852764,1.7218512227,-10.18525008,-5.99183789,-8.999571449,-10.36619175,-3.703793952,-14.76689056,-4.902527577,1.9455703532,-8.0817464,1.5357051446,-10.41885673,-6.039017716,-8.761487548,-10.26976206,-3.167718512,-14.37178981 +050,3,5,54,045,West Virginia,Logan County,36743,36750,36719,36462,36322,35937,35254,34444,33662,33030,32597,31989,31688,-31,-257,-140,-385,-683,-810,-782,-632,-433,-608,-301,101,457,437,440,415,375,339,362,359,322,318,150,525,543,540,527,528,563,570,563,515,529,-49,-68,-106,-100,-112,-153,-224,-208,-204,-193,-211,0,-3,-1,-3,-2,0,1,1,2,-1,0,20,-185,-26,-284,-586,-665,-561,-426,-232,-415,-89,20,-188,-27,-287,-588,-665,-560,-425,-230,-416,-89,-2,-1,-7,2,17,8,2,1,1,1,-1,464,464,464,596,672,632,551,556,690,682,681,681,12.489580629,12.008133656,12.178413762,11.658777093,10.760710494,9.9550700379,10.855874768,10.940618953,9.9712011891,9.9879077218,14.347986499,14.920861728,14.946235071,14.805242236,15.151080375,16.53305142,17.093504468,17.157572341,15.94772861,16.615104355,-1.85840587,-2.912728072,-2.767821309,-3.146465143,-4.390369881,-6.577981382,-6.237629701,-6.216953388,-5.976527421,-6.627196633,-0.081988494,-0.027478567,-0.083034639,-0.056186878,0,0.0293659883,0.0299886043,0.0609505234,-0.030966463,0,-5.055957147,-0.714442735,-7.860612519,-16.46275512,-19.08232661,-16.47431944,-12.77514544,-7.070260716,-12.85108228,-2.795357822,-5.137945642,-0.741921301,-7.943647158,-16.518942,-19.08232661,-16.44495345,-12.74515684,-7.009310192,-12.88204874,-2.795357822 +050,3,5,54,047,West Virginia,McDowell County,22113,22108,22094,21730,21318,20963,20390,19768,19186,18517,18198,17600,16916,-14,-364,-412,-355,-573,-622,-582,-669,-319,-598,-684,67,270,271,281,251,221,206,219,191,160,165,54,382,395,384,322,340,338,337,332,322,353,13,-112,-124,-103,-71,-119,-132,-118,-141,-162,-188,1,10,5,58,24,22,0,10,8,31,25,-29,-262,-299,-318,-541,-532,-453,-565,-185,-467,-517,-28,-252,-294,-260,-517,-510,-453,-555,-177,-436,-492,1,0,6,8,15,7,3,4,-1,0,-4,471,471,471,471,376,240,139,139,139,139,139,139,12.322015334,12.590596543,13.292022421,12.139385292,11.006524229,10.576577502,11.617112697,10.404466839,8.9390468741,9.5607834048,17.433369843,18.351607508,18.164187224,15.573235315,16.933114199,17.35380192,17.876561547,18.08525126,17.989831834,20.454282072,-5.111354509,-5.761010965,-4.872164802,-3.433850023,-5.92658997,-6.777224419,-6.25944885,-7.680784421,-9.05078496,-10.89349867,0.4563709383,0.2322988292,2.7435491119,1.1607380359,1.0956720952,0,0.530461767,0.435789187,1.7319403319,1.4486035462,-11.95691858,-13.89146999,-15.04221754,-26.16496989,-26.49534339,-23.25820198,-29.97108983,-10.07762495,-26.09084306,-29.95712134,-11.50054765,-13.65917116,-12.29866843,-25.00423186,-25.3996713,-23.25820198,-29.44062807,-9.641835762,-24.35890273,-28.50851779 +050,3,5,54,049,West Virginia,Marion County,56418,56451,56566,56715,56791,56762,56841,56815,56557,56430,56132,56077,55962,115,149,76,-29,79,-26,-258,-127,-298,-55,-115,172,685,641,664,646,630,630,666,592,565,558,116,657,635,657,636,707,726,692,721,708,716,56,28,6,7,10,-77,-96,-26,-129,-143,-158,3,48,9,57,18,15,8,9,2,12,9,59,76,71,-84,62,43,-167,-108,-169,76,31,62,124,80,-27,80,58,-159,-99,-167,88,40,-3,-3,-10,-9,-11,-7,-3,-2,-2,0,3,1340,1340,1340,1340,1340,1310,1343,1356,1332,1399,1400,1401,12.093819793,11.294557116,11.694979437,11.372939095,11.086084325,11.113855273,11.788966872,10.518647501,10.070493454,9.9608172154,11.599473875,11.188835832,11.571688991,11.196887406,12.441050187,12.807395124,12.24919681,12.810717649,12.619308612,12.781263667,0.4943459186,0.1057212835,0.1232904459,0.1760516888,-1.354965862,-1.693539851,-0.460229938,-2.292070148,-2.548815157,-2.820446452,0.8474501461,0.1585819252,1.0039364878,0.3168930398,0.2639543887,0.1411283209,0.1593103631,0.0355359713,0.2138865866,0.1606583422,1.3417960647,1.2510351876,-1.47948535,1.0915204704,0.7566692476,-2.946053699,-1.911724358,-3.002789574,1.3546150487,0.5533787342,2.1892462108,1.4096171128,-0.475548863,1.4084135102,1.0206236362,-2.804925378,-1.752413995,-2.967253602,1.5685016353,0.7140370764 +050,3,5,54,051,West Virginia,Marshall County,33107,33128,33091,32935,32827,32647,32363,32218,31736,31260,30845,30558,30103,-37,-156,-108,-180,-284,-145,-482,-476,-415,-287,-455,75,320,294,351,328,331,325,289,280,278,269,108,410,405,429,409,402,431,389,406,397,417,-33,-90,-111,-78,-81,-71,-106,-100,-126,-119,-148,-1,10,6,2,0,0,1,8,1,13,11,3,-75,5,-99,-202,-69,-379,-384,-289,-181,-318,2,-65,11,-97,-202,-69,-378,-376,-288,-168,-307,-6,-1,-8,-5,-1,-5,2,0,-1,0,0,447,447,447,489,524,447,584,496,539,552,555,550,9.6931511829,8.941333901,10.721813239,10.090755268,10.250692928,10.163555055,9.1751857261,9.0169873601,9.0549321694,8.8689602875,12.419349953,12.317143639,13.104438403,12.582679588,12.449482046,13.478437627,12.349990476,13.074631672,12.930964285,13.748536951,-2.72619877,-3.375809738,-2.382625164,-2.491924319,-2.198789118,-3.314882572,-3.17480475,-4.057644312,-3.876032116,-4.879576664,0.3029109745,0.1824762021,0.0610929529,0,0,0.0312724771,0.25398438,0.0322035263,0.4234320799,0.3626712385,-2.271832308,0.1520635017,-3.02410117,-6.214428549,-2.136851396,-11.85226882,-12.19125024,-9.306819097,-5.89547742,-10.4844958,-1.968921334,0.3345397038,-2.963008217,-6.214428549,-2.136851396,-11.82099634,-11.93726586,-9.27461557,-5.47204534,-10.12182457 +050,3,5,54,053,West Virginia,Mason County,27324,27358,27377,27328,27233,27164,27177,27117,26956,26841,26795,26572,26335,19,-49,-95,-69,13,-60,-161,-115,-46,-223,-237,82,278,299,275,281,290,248,273,274,253,254,72,330,315,341,355,338,368,358,355,349,387,10,-52,-16,-66,-74,-48,-120,-85,-81,-96,-133,0,-4,-4,-5,-1,2,5,3,-1,5,5,13,9,-72,6,90,-10,-45,-31,38,-132,-109,13,5,-76,1,89,-8,-40,-28,37,-127,-104,-4,-2,-3,-4,-2,-4,-1,-2,-2,0,0,635,635,635,635,635,692,690,679,676,682,682,683,10.163604789,10.960209674,10.110851701,10.342098968,10.682580027,9.1727849389,10.149264829,10.21701842,9.4815147938,9.6017540212,12.064710721,11.546709188,12.53745611,13.065641045,12.450731204,13.611229264,13.30929234,13.237377881,13.079243727,14.629444119,-1.901105932,-0.586499514,-2.426604408,-2.723542077,-1.768151177,-4.438444325,-3.160027511,-3.02035946,-3.597728934,-5.027690098,-0.146238918,-0.146624879,-0.183833667,-0.036804623,0.0736729657,0.1849351802,0.1115303827,-0.037288388,0.1873817153,0.1890109059,0.3290375651,-2.639247814,0.2206004008,3.3124160395,-0.368364829,-1.664416622,-1.152480622,1.416958759,-4.946877284,-4.120437749,0.1827986473,-2.785872693,0.0367667335,3.2756114168,-0.294691863,-1.479481442,-1.040950239,1.3796703706,-4.759495568,-3.931426843 +050,3,5,54,055,West Virginia,Mercer County,62264,62265,62335,62568,62441,61947,61807,61187,60638,59903,59228,58823,58258,70,233,-127,-494,-140,-620,-549,-735,-675,-405,-565,192,762,804,740,732,750,662,719,668,665,642,165,899,951,927,895,899,864,889,965,878,958,27,-137,-147,-187,-163,-149,-202,-170,-297,-213,-316,1,88,17,22,21,27,11,-3,-13,10,8,46,282,20,-324,18,-498,-355,-562,-364,-201,-259,47,370,37,-302,39,-471,-344,-565,-377,-191,-251,-4,0,-17,-5,-16,0,-3,0,-1,-1,2,1188,1188,1188,1111,1111,1111,1110,1111,1111,1114,1113,1114,12.201468339,12.863073859,11.898253851,11.829920649,12.195716864,10.86804843,11.929550941,11.214545332,11.2663171,10.966766597,14.395170652,15.214904527,14.904974756,14.464178936,14.618599281,14.184280731,14.750167993,16.200653063,14.874926938,16.364738941,-2.193702313,-2.351830668,-3.006720906,-2.634258287,-2.422882417,-3.3162323,-2.820617051,-4.98610773,-3.608609838,-5.397972344,1.4090934565,0.2719804174,0.3537318712,0.3393829694,0.4390458071,0.1805869074,-0.049775595,-0.21824714,0.1694183023,0.1366575277,4.5155040311,0.3199769617,-5.20950574,0.2908996881,-8.097955998,-5.828032013,-9.324628135,-6.110919912,-3.405307875,-4.424287459,5.9245974877,0.5919573791,-4.855773869,0.6302826575,-7.658910191,-5.647445106,-9.37440373,-6.329167051,-3.235889573,-4.287629931 +050,3,5,54,057,West Virginia,Mineral County,28212,28225,28208,28066,27895,27700,27580,27431,27404,27227,26979,26904,26722,-17,-142,-171,-195,-120,-149,-27,-177,-248,-75,-182,76,276,281,324,284,274,290,251,268,248,240,105,312,303,347,280,320,340,343,342,348,373,-29,-36,-22,-23,4,-46,-50,-92,-74,-100,-133,0,-1,1,1,17,22,12,-4,-6,-2,0,16,-105,-149,-171,-138,-125,14,-80,-169,26,-48,16,-106,-148,-170,-121,-103,26,-84,-175,24,-48,-4,0,-1,-2,-3,0,-3,-1,1,1,-1,646,646,646,666,687,689,653,600,566,519,519,519,9.8091480968,10.042708315,11.655724436,10.274963821,9.9616440348,10.577186104,9.1889220406,9.8882042578,9.2051296327,8.9508820348,11.088602196,10.828970176,12.483136973,10.13024602,11.634036829,12.40083888,12.556973147,12.618529314,12.916875452,13.911162496,-1.2794541,-0.786261861,-0.827412537,0.1447178003,-1.672392794,-1.823652777,-3.368051107,-2.730325056,-3.71174582,-4.960280461,-0.035540392,0.0357391755,0.0359744581,0.6150506512,0.799840032,0.4376766664,-0.146437005,-0.221377707,-0.074234916,0,-3.731741124,-5.325137149,-6.151632341,-4.99276411,-4.544545636,0.5106227774,-2.928740093,-6.235472088,0.9650539131,-1.790176407,-3.767281515,-5.289397974,-6.115657883,-4.377713459,-3.744705604,0.9482994438,-3.075177097,-6.456849795,0.8908189967,-1.790176407 +050,3,5,54,059,West Virginia,Mingo County,26839,26834,26769,26605,26193,26015,25742,25321,24700,24151,23847,23390,22951,-65,-164,-412,-178,-273,-421,-621,-549,-304,-457,-439,96,356,364,350,325,341,270,308,304,264,252,115,341,359,378,383,355,349,370,377,335,400,-19,15,5,-28,-58,-14,-79,-62,-73,-71,-148,0,41,2,16,0,0,0,-1,-1,-1,0,-47,-221,-431,-164,-215,-412,-544,-490,-230,-384,-289,-47,-180,-429,-148,-215,-412,-544,-491,-231,-385,-289,1,1,12,-2,0,5,2,4,0,-1,-2,85,85,85,85,85,85,85,85,85,85,85,85,13.339828381,13.788401076,13.407906834,12.558687714,13.356050369,10.795465904,12.609772574,12.667194466,11.177678515,10.875898233,12.77775696,13.598999962,14.480539381,14.799930444,13.904392613,13.954139262,15.148103417,15.708987874,14.1837966,17.263330528,0.5620714205,0.1894011137,-1.072632547,-2.24124273,-0.548342244,-3.158673357,-2.538330843,-3.041793408,-3.006118085,-6.387432295,1.5363285495,0.0757604455,0.6129328838,0,0,0,-0.04094082,-0.041668403,-0.042339691,0,-8.281185596,-16.326376,-6.282562059,-8.308054949,-16.13692889,-21.75086464,-20.06100182,-9.583732656,-16.25844148,-12.47275631,-6.744857047,-16.25061555,-5.669629176,-8.308054949,-16.13692889,-21.75086464,-20.10194264,-9.625401058,-16.30078117,-12.47275631 +050,3,5,54,061,West Virginia,Monongalia County,96189,96192,96768,99070,101009,102392,103631,104871,105866,106086,105930,106281,106819,576,2302,1939,1383,1239,1240,995,220,-156,351,538,225,1070,1046,1035,1122,1202,1070,1101,1068,994,975,124,640,650,674,655,693,712,732,722,745,788,101,430,396,361,467,509,358,369,346,249,187,31,661,383,313,546,655,587,267,35,491,387,405,1198,1117,696,236,86,50,-414,-540,-393,-45,436,1859,1500,1009,782,741,637,-147,-505,98,342,39,13,43,13,-10,-10,0,-2,3,4,9,7262,7263,7262,7305,7082,6797,6334,6625,6763,6375,6380,6380,10.927399177,10.455869931,10.176941116,10.891987788,11.529865421,10.154837546,10.389144712,10.074711343,9.3680346448,9.1506335054,6.5360144609,6.4974335138,6.6273027173,6.3585133699,6.6474182502,6.7572376944,6.9072242772,6.8108067316,7.0213136925,7.3955889254,4.3913847159,3.9584364176,3.549638399,4.5334744179,4.8824471708,3.3975998519,3.4819204348,3.263904611,2.3467209523,1.75504458,6.7504774354,3.8284877473,3.0776643183,5.3003790839,6.2829133533,5.5709248969,2.5194383634,0.3301637612,4.6274698296,3.6320976068,12.234602069,11.165589592,6.843624171,2.291006344,0.8249321349,0.474525119,-3.906544878,-5.093955173,-3.70386078,-0.422336931,18.985079504,14.994077339,9.9212884892,7.5913854278,7.1078454883,6.0454500159,-1.387106515,-4.763791412,0.9236090495,3.2097606757 +050,3,5,54,063,West Virginia,Monroe County,13502,13496,13520,13551,13503,13523,13619,13586,13506,13397,13293,13295,13229,24,31,-48,20,96,-33,-80,-109,-104,2,-66,40,120,147,151,120,120,135,126,117,127,127,29,174,170,182,168,187,155,182,179,173,175,11,-54,-23,-31,-48,-67,-20,-56,-62,-46,-48,0,-1,0,-2,14,11,9,3,-1,8,7,15,86,-25,54,131,25,-70,-55,-40,41,-25,15,85,-25,52,145,36,-61,-52,-41,49,-18,-2,0,0,-1,-1,-2,1,-1,-1,-1,0,57,57,57,57,57,57,57,57,57,57,57,57,8.8655757083,10.86715458,11.174424628,8.8423844964,8.8219077375,9.9660416359,9.3669850946,8.7673285875,9.5531818866,9.5762328457,12.855084777,12.567457677,13.468511803,12.379338295,13.747472891,11.442492249,13.530089581,13.413263395,13.013389499,13.195596441,-3.989509069,-1.700303098,-2.294087175,-3.536953799,-4.925565153,-1.476450613,-4.163104486,-4.645934807,-3.460207612,-3.619363595,-0.073879798,0,-0.148005624,1.0316115246,0.8086748759,0.6644027757,0.2230234546,-0.074934432,0.6017752369,0.5278238576,6.353662591,-1.848155541,3.9961518538,9.6529364085,1.8378974453,-5.167577145,-4.088763335,-2.997377295,3.0840980894,-1.885085206,6.2797827934,-1.848155541,3.8481462296,10.684547933,2.6465723213,-4.503174369,-3.86573988,-3.072311727,3.6858733263,-1.357261348 +050,3,5,54,065,West Virginia,Morgan County,17541,17541,17492,17471,17434,17453,17533,17513,17661,17740,17852,17875,17873,-49,-21,-37,19,80,-20,148,79,112,23,-2,43,132,146,134,160,141,142,140,145,124,123,72,202,198,208,210,213,229,250,225,229,240,-29,-70,-52,-74,-50,-72,-87,-110,-80,-105,-117,-1,24,-9,32,11,0,-6,-6,-6,-6,-4,-17,24,29,62,118,55,240,196,197,136,119,-18,48,20,94,129,55,234,190,191,130,115,-2,1,-5,-1,1,-3,1,-1,1,-2,0,123,123,123,123,123,123,123,123,123,123,123,123,7.5508394589,8.3655636728,7.6819445639,9.1465157492,8.0465673686,8.0741456758,7.9093810909,8.1478984041,6.9415288157,6.8815038604,11.555072505,11.345079502,11.924212457,12.004801921,12.155452833,13.020981407,14.123894805,12.643290627,12.819436281,13.427324606,-4.004233046,-2.979515829,-4.242267893,-2.858286172,-4.108885465,-4.946835731,-6.214513714,-4.495392223,-5.877907465,-6.545820745,1.3728799016,-0.515685432,1.8344942242,0.6288229578,0,-0.341161085,-0.338973475,-0.337154417,-0.335880427,-0.223788743,1.3728799016,1.6616530583,3.5543325594,6.745555365,3.1387319523,13.646443396,11.073133527,11.069903349,7.6132896689,6.6577151169,2.7457598032,1.1459676264,5.3888267836,7.3743783228,3.1387319523,13.305282311,10.734160052,10.732748932,7.2774092423,6.4339263735 +050,3,5,54,067,West Virginia,Nicholas County,26233,26225,26219,26207,26255,25943,25712,25547,25372,25126,24877,24569,24340,-6,-12,48,-312,-231,-165,-175,-246,-249,-308,-229,77,287,302,298,265,276,264,268,260,218,219,98,338,298,383,308,344,293,369,336,335,380,-21,-51,4,-85,-43,-68,-29,-101,-76,-117,-161,3,32,0,-2,1,21,20,14,7,21,16,16,8,48,-229,-191,-117,-165,-159,-180,-212,-83,19,40,48,-231,-190,-96,-145,-145,-173,-191,-67,-4,-1,-4,4,2,-1,-1,0,0,0,-1,162,162,162,162,162,162,162,162,162,162,162,162,10.94876588,11.513095193,11.418061995,10.260381376,10.768840594,10.36941024,10.614281754,10.399376037,8.8177001173,8.9554069803,12.894365391,11.360603866,14.674891758,11.925273449,13.422033204,11.508474243,14.614440176,13.439193648,13.550135501,15.53906234,-1.945599512,0.1524913271,-3.256829764,-1.664892072,-2.65319261,-1.139064004,-4.000158422,-3.039817611,-4.732435384,-6.58365536,1.2207683211,0,-0.076631289,0.0387184203,0.8193683061,0.7855613818,0.554477405,0.279983201,0.8494114792,0.6542763091,0.3051920803,1.8298959247,-8.77428254,-7.395218275,-4.565051991,-6.4808814,-6.2972791,-7.199568026,-8.575011123,-3.394058353,1.5259604013,1.8298959247,-8.850913828,-7.356499855,-3.745683685,-5.695320018,-5.742801695,-6.919584825,-7.725599644,-2.739782044 +050,3,5,54,069,West Virginia,Ohio County,44443,44433,44477,44216,44017,43762,43279,43018,42659,42069,41841,41626,41182,44,-261,-199,-255,-483,-261,-359,-590,-228,-215,-444,104,464,503,481,455,478,416,421,440,394,408,110,584,596,597,554,614,552,579,556,577,623,-6,-120,-93,-116,-99,-136,-136,-158,-116,-183,-215,3,45,13,8,14,13,9,3,-2,9,7,50,-184,-115,-143,-401,-136,-231,-436,-108,-40,-235,53,-139,-102,-135,-387,-123,-222,-433,-110,-31,-228,-3,-2,-4,-4,3,-2,-1,1,-2,-1,-1,2618,2618,2618,2597,2524,2495,2379,2381,2385,2388,2389,2390,10.463057964,11.401629776,10.959341072,10.45484312,11.078021252,9.7108909042,9.9376829383,10.487427005,9.4408568656,9.8541203748,13.169021231,13.509684585,13.602342246,12.729633161,14.22992688,12.885605238,13.667264659,13.252294125,13.825823379,15.046855376,-2.705963267,-2.108054809,-2.643001173,-2.274790041,-3.151905628,-3.174714334,-3.72958172,-2.76486712,-4.384966514,-5.192735001,1.014736225,0.2946743282,0.182275943,0.3216874806,0.3012850968,0.2100913898,0.0708148428,-0.047670123,0.2156540908,0.1690657907,-4.149143675,-2.606734442,-3.258182481,-9.214048552,-3.151905628,-5.39234567,-10.29175715,-2.574186629,-0.958462626,-5.675780118,-3.13440745,-2.312060114,-3.075906538,-8.892361071,-2.850620531,-5.182254281,-10.22094231,-2.621856751,-0.742808535,-5.506714327 +050,3,5,54,071,West Virginia,Pendleton County,7695,7695,7676,7539,7474,7381,7233,7106,6994,6978,6976,6960,6932,-19,-137,-65,-93,-148,-127,-112,-16,-2,-16,-28,14,65,82,68,82,54,80,68,53,61,59,30,112,96,102,95,89,85,100,99,80,76,-16,-47,-14,-34,-13,-35,-5,-32,-46,-19,-17,2,-2,22,8,4,3,0,0,0,0,0,-4,-88,-74,-68,-144,-96,-109,18,44,4,-11,-2,-90,-52,-60,-140,-93,-109,18,44,4,-11,-1,0,1,1,5,1,2,-2,0,-1,0,196,196,194,195,211,140,117,117,117,117,117,117,8.5441998028,10.923865983,9.1551666106,11.222115779,7.5319059907,11.34751773,9.7337532207,7.5963881324,8.7543053961,8.4940973222,14.722313506,12.788916273,13.732749916,13.001231696,12.413696911,12.056737589,14.314342972,14.189479719,11.481056257,10.941549093,-6.178113704,-1.86505029,-4.577583305,-1.779115916,-4.88179092,-0.709219858,-4.580589751,-6.593091587,-2.726750861,-2.447451771,-0.262898455,2.9307933125,1.0770784248,0.5474202819,0.4184392217,0,0,0,0,0,-11.56753204,-9.85812296,-9.155166611,-19.70713015,-13.39005509,-15.46099291,2.5765817349,6.3064354307,0.5740528129,-1.583645263,-11.8304305,-6.927329648,-8.078088186,-19.15970987,-12.97161587,-15.46099291,2.5765817349,6.3064354307,0.5740528129,-1.583645263 +050,3,5,54,073,West Virginia,Pleasants County,7605,7600,7569,7572,7531,7517,7589,7499,7493,7460,7479,7416,7438,-31,3,-41,-14,72,-90,-6,-33,19,-63,22,18,62,57,68,72,78,74,63,80,70,72,33,98,100,90,72,108,82,91,110,88,80,-15,-36,-43,-22,0,-30,-8,-28,-30,-18,-8,0,0,0,0,-1,-2,0,0,0,0,0,-18,40,3,8,71,-58,2,-5,51,-46,31,-18,40,3,8,70,-60,2,-5,51,-46,31,2,-1,-1,0,2,0,0,0,-2,1,-1,623,623,623,623,623,671,671,697,699,699,701,697,8.1896836404,7.5481692379,9.0377458799,9.5326360387,10.339342524,9.8719316969,8.4264027285,10.710221568,9.3991272239,9.694358422,12.944983819,13.242402172,11.961722488,9.5326360387,14.316012725,10.939167556,12.171470608,14.726554656,11.816045653,10.771509358,-4.755300178,-5.694232934,-2.923976608,0,-3.976670201,-1.067235859,-3.745067879,-4.016333088,-2.416918429,-1.077150936,0,0,0,-0.132397723,-0.265111347,0,0,0,0,0,5.2836668648,0.3972720652,1.0632642212,9.4002383159,-7.688229056,0.2668089648,-0.668762121,6.8277662494,-6.176569319,4.1739598761,5.2836668648,0.3972720652,1.0632642212,9.2678405931,-7.953340403,0.2668089648,-0.668762121,6.8277662494,-6.176569319,4.1739598761 +050,3,5,54,075,West Virginia,Pocahontas County,8719,8722,8734,8826,8704,8683,8656,8576,8532,8494,8420,8274,8190,12,92,-122,-21,-27,-80,-44,-38,-74,-146,-84,25,90,81,87,78,80,88,90,75,70,70,12,115,92,110,111,108,102,98,112,111,139,13,-25,-11,-23,-33,-28,-14,-8,-37,-41,-69,0,6,3,0,-1,0,-1,0,0,0,0,0,111,-118,3,8,-52,-28,-30,-36,-104,-15,0,117,-115,3,7,-52,-29,-30,-36,-104,-15,-1,0,4,-1,-1,0,-1,0,-1,-1,0,318,318,318,318,318,318,318,318,318,320,319,319,10.250569476,9.2413006275,10.007476851,8.9970586539,9.2850510678,10.287584756,10.572066252,8.8683930472,8.3862465556,8.5034013605,13.097949886,10.496292071,12.65313165,12.803506546,12.534818942,11.924245967,11.511805474,13.24346695,13.298190967,16.885325559,-2.84738041,-1.254991443,-2.6456548,-3.806447892,-3.249767874,-1.636661211,-0.939739222,-4.375073903,-4.911944411,-8.381924198,0.6833712984,0.3422703936,0,-0.115346906,0,-0.116904372,0,0,0,0,12.642369021,-13.46263548,0.3450854086,0.9227752466,-6.035283194,-3.273322422,-3.524022084,-4.256828663,-12.45956631,-1.822157434,13.325740319,-13.12036509,0.3450854086,0.8074283407,-6.035283194,-3.390226794,-3.524022084,-4.256828663,-12.45956631,-1.822157434 +050,3,5,54,077,West Virginia,Preston County,33520,33511,33546,33660,33905,33693,33927,33855,33802,33846,33543,33479,33380,35,114,245,-212,234,-72,-53,44,-303,-64,-99,76,355,368,337,339,348,351,326,318,321,321,42,369,337,367,363,362,391,371,419,351,387,34,-14,31,-30,-24,-14,-40,-45,-101,-30,-66,1,-1,0,0,8,49,52,51,76,-1,21,6,128,214,-182,247,-106,-64,40,-279,-32,-56,7,127,214,-182,255,-57,-12,91,-203,-33,-35,-6,1,0,0,3,-1,-1,-2,1,-1,2,2378,2377,2373,2367,2301,2370,2189,2063,2102,1823,1824,1822,10.564532929,10.893213942,9.9707091926,10.026619343,10.2682128,10.375866503,9.6381267739,9.4377420647,9.5789442273,9.6022973721,10.981162396,9.975579072,10.858309417,10.7364685,10.681301821,11.558301432,10.968543046,12.435263915,10.47417266,11.576601505,-0.416629468,0.9176348701,-0.887600225,-0.709849157,-0.413089021,-1.182434929,-1.330416272,-2.997521851,-0.895228432,-1.974304133,-0.029759248,0,0,0.2366163857,1.4458115724,1.5371654079,1.5078051088,2.2555609966,-0.029840948,0.6281876785,3.8091837038,6.3346407163,-5.384774697,7.305530908,-3.127674014,-1.891895887,1.1825922422,-8.280283132,-0.954910328,-1.675167143,3.7794244561,6.3346407163,-5.384774697,7.5421472937,-1.681862441,-0.354730479,2.690397351,-6.024722136,-0.984751276,-1.046979464 +050,3,5,54,079,West Virginia,Putnam County,55486,55488,55620,56032,56448,56496,56631,56601,56670,56704,56710,56507,56428,132,412,416,48,135,-30,69,34,6,-203,-79,117,605,606,596,636,636,564,550,536,481,495,87,528,529,580,565,592,566,612,637,608,641,30,77,77,16,71,44,-2,-62,-101,-127,-146,6,24,29,19,15,10,8,7,1,11,9,96,312,312,21,58,-79,67,94,108,-89,59,102,336,341,40,73,-69,75,101,109,-78,68,0,-1,-2,-8,-9,-5,-4,-5,-2,2,-1,249,249,249,249,249,249,249,249,249,249,249,249,10.837244295,10.775248933,10.553902819,11.244000106,11.233573548,9.9584183065,9.7024009032,9.4520958612,8.4969571707,8.7661043963,9.4579586573,9.406116643,10.270576569,9.9887736791,10.456408083,9.9937318466,10.796126096,11.233181089,10.740436507,11.351662461,1.3792856375,1.3691322902,0.2833262502,1.2552264269,0.7771654656,-0.03531354,-1.093725193,-1.781085228,-2.243479336,-2.585558064,0.4299072117,0.5156472262,0.3364499221,0.2651886817,0.1766285149,0.1412541604,0.1234851024,0.0176345072,0.1943171079,0.1593837163,5.588793752,5.5476529161,0.3718657034,1.0253962361,-1.395365268,1.1830035932,1.658228518,1.904526778,-1.572202054,1.0448488068,6.0187009637,6.0633001422,0.7083156254,1.2905849178,-1.218736753,1.3242577535,1.7817136204,1.9221612852,-1.377884947,1.2042325231 +050,3,5,54,081,West Virginia,Raleigh County,78859,78865,78921,79366,79284,78843,78236,77416,76319,75106,74256,73659,72920,56,445,-82,-441,-607,-820,-1097,-1213,-850,-597,-739,233,986,989,955,912,843,814,832,777,774,766,237,988,1005,1069,935,1030,1082,1032,1094,1031,1112,-4,-2,-16,-114,-23,-187,-268,-200,-317,-257,-346,13,131,79,39,33,39,32,15,0,29,24,52,316,-134,-364,-615,-673,-861,-1032,-531,-367,-417,65,447,-55,-325,-582,-634,-829,-1017,-531,-338,-393,-5,0,-11,-2,-2,1,0,4,-2,-2,0,3857,3857,3852,3842,3801,3793,3822,3712,3697,3660,3662,3660,12.458382558,12.467696187,12.078898607,11.611991418,10.831855678,10.589651023,10.988938418,10.404252755,10.465470033,10.451701813,12.483653111,12.669398046,13.520777603,11.904837693,13.234651659,14.076170033,13.630510154,14.648973635,13.940438766,15.172705504,-0.025270553,-0.201701859,-1.441878996,-0.292846275,-2.402795981,-3.48651901,-2.641571735,-4.244720879,-3.474968732,-4.721003691,1.6552212121,0.995902931,0.4932743934,0.4201707421,0.5011178783,0.4163007773,0.1981178801,0,0.3921170943,0.3274684641,3.9927473513,-1.689253073,-4.603894338,-7.830454739,-8.647495696,-11.20109279,-13.63051015,-7.11024223,-4.962309434,-5.689764564,5.6479685634,-0.693350142,-4.110619945,-7.410283997,-8.146377817,-10.78479201,-13.43239227,-7.11024223,-4.57019234,-5.3622961 +050,3,5,54,083,West Virginia,Randolph County,29405,29402,29360,29432,29388,29519,29371,29209,29038,28896,28823,28670,28387,-42,72,-44,131,-148,-162,-171,-142,-73,-153,-283,61,307,310,328,316,313,288,297,291,258,253,86,357,366,356,350,370,380,350,366,370,409,-25,-50,-56,-28,-34,-57,-92,-53,-75,-112,-156,0,14,8,11,12,20,12,5,-1,10,8,-16,109,10,148,-122,-124,-89,-93,6,-53,-134,-16,123,18,159,-110,-104,-77,-88,5,-43,-126,-1,-1,-6,0,-4,-1,-2,-1,-3,2,-1,2273,2273,2273,2232,2330,2327,2320,2312,2312,2304,2302,2306,10.443597768,10.540632438,11.136197735,10.731872984,10.686241038,9.8889213178,10.25304657,10.083334777,8.9750056529,8.8683246578,12.144509457,12.444746685,12.086848762,11.886568178,12.632297713,13.047882294,12.082714813,12.6821324,12.871132138,14.336540652,-1.700911689,-1.904114247,-0.950651026,-1.154695194,-1.946056675,-3.158960977,-1.829668243,-2.598797623,-3.896126485,-5.468215995,0.4762552728,0.272016321,0.373470046,0.4075394804,0.6828269034,0.4120383882,0.1726102116,-0.034650635,0.3478684362,0.2804213331,3.7079874813,0.3400204012,5.0248697099,-4.143318051,-4.233526801,-3.055951379,-3.210549936,0.2079038098,-1.843702712,-4.697057329,4.1842427541,0.6120367222,5.3983397559,-3.73577857,-3.550699898,-2.643912991,-3.037939725,0.1732531749,-1.495834275,-4.416635996 +050,3,5,54,085,West Virginia,Ritchie County,10449,10449,10420,10315,10254,10153,10082,10089,9990,9856,9774,9616,9499,-29,-105,-61,-101,-71,7,-99,-134,-82,-158,-117,23,99,95,89,89,112,102,90,87,93,90,45,123,123,113,111,143,106,118,134,145,165,-22,-24,-28,-24,-22,-31,-4,-28,-47,-52,-75,0,1,0,0,1,-1,17,10,2,18,17,-6,-81,-33,-77,-50,39,-112,-117,-36,-123,-59,-6,-80,-33,-77,-49,38,-95,-107,-34,-105,-42,-1,-1,0,0,0,0,0,1,-1,-1,0,106,106,106,106,106,106,106,106,106,106,106,106,9.549071618,9.2372016141,8.7224971823,8.796639486,11.105051807,10.159868519,9.0698377507,8.8639836984,9.5925734915,9.4166884646,11.863998071,11.959745248,11.074631254,10.971089696,14.178771504,10.558294736,11.891565051,13.652572593,14.956162971,17.263928852,-2.314926453,-2.722543634,-2.352134072,-2.17445021,-3.073719697,-0.398426216,-2.8217273,-4.788588895,-5.363589479,-7.847240387,0.0964552689,0,0,0.0988386459,-0.099152248,1.6933114199,1.0077597501,0.2037697402,1.8566271274,1.7787078211,-7.812876778,-3.20871214,-7.546430147,-4.941932296,3.8669376828,-11.15593406,-11.79078908,-3.667855323,-12.68695204,-6.173162438,-7.71642151,-3.20871214,-7.546430147,-4.84309365,3.7677854345,-9.462622641,-10.78302933,-3.464085583,-10.83032491,-4.394454617 +050,3,5,54,087,West Virginia,Roane County,14926,14928,14897,14803,14679,14609,14597,14379,14122,14020,13880,13651,13482,-31,-94,-124,-70,-12,-218,-257,-102,-140,-229,-169,33,159,172,147,158,140,131,126,141,123,122,65,173,164,207,190,203,196,202,252,186,203,-32,-14,8,-60,-32,-63,-65,-76,-111,-63,-81,0,-1,0,2,4,1,9,5,0,9,8,3,-79,-133,-9,20,-157,-201,-31,-28,-174,-96,3,-80,-133,-7,24,-156,-192,-26,-28,-165,-88,-2,0,1,-3,-4,1,0,0,-1,-1,0,98,98,98,98,98,98,98,98,98,98,98,98,10.707070707,11.66813649,10.038240918,10.819694583,9.6631695196,9.1926599067,8.9545874494,10.107526882,8.9353819331,8.9927394685,11.64983165,11.125432467,14.135482109,13.011025132,14.011595803,13.753903372,14.355767181,18.064516129,13.512040972,14.963328788,-0.942760943,0.5427040228,-4.097241191,-2.191330549,-4.348426284,-4.561243465,-5.401179731,-7.956989247,-4.576659039,-5.970589319,-0.067340067,0,0.1365747064,0.2739163186,0.0690226394,0.6315567875,0.3553407718,0,0.6538084341,0.589687834,-5.31986532,-9.022454379,-0.614586179,1.3695815928,-10.83655439,-14.10476825,-2.203112785,-2.007168459,-12.64029639,-7.076254008,-5.387205387,-9.022454379,-0.478011472,1.6434979114,-10.76753175,-13.47321147,-1.847772013,-2.007168459,-11.98648796,-6.486566174 +050,3,5,54,089,West Virginia,Summers County,13927,13926,13939,13857,13838,13597,13344,13150,13003,12897,12668,12536,12444,13,-82,-19,-241,-253,-194,-147,-106,-229,-132,-92,29,127,116,111,97,96,129,94,108,100,94,33,213,179,186,199,200,197,210,206,175,166,-4,-86,-63,-75,-102,-104,-68,-116,-98,-75,-72,0,3,0,0,-2,-2,-1,-1,-1,-1,-1,18,2,47,-170,-150,-91,-77,11,-130,-54,-19,18,5,47,-170,-152,-93,-78,10,-131,-55,-20,-1,-1,-3,4,1,3,-1,0,0,-2,0,1329,1329,1329,1329,1310,1212,1093,1132,1105,1030,1028,1025,9.1380054684,8.3769633508,8.0918534718,7.20092053,7.2469238318,9.8650250449,7.2586872587,8.4490514375,7.9352483733,7.5260208167,15.325946179,12.926521033,13.559322034,14.773022531,15.097757983,15.065193286,16.216216216,16.115783297,13.886684653,13.290632506,-6.187940711,-4.549557682,-5.467468562,-7.572102001,-7.850834151,-5.200168241,-8.957528958,-7.66673186,-5.95143628,-5.764611689,0.2158583969,0,0,-0.148472588,-0.15097758,-0.076473062,-0.077220077,-0.078231958,-0.079352484,-0.080064051,0.1439055979,3.3941144611,-12.39292874,-11.13544412,-6.869479882,-5.888425802,0.8494208494,-10.17015451,-4.285034122,-1.521216974,0.3597639948,3.3941144611,-12.39292874,-11.28391671,-7.020457462,-5.964898864,0.7722007722,-10.24838647,-4.364386605,-1.601281025 +050,3,5,54,091,West Virginia,Taylor County,16895,16876,16876,16919,16960,16978,17091,16920,16952,16907,16820,16707,16699,0,43,41,18,113,-171,32,-45,-87,-113,-8,51,172,182,183,177,163,189,162,122,147,138,69,203,197,186,181,204,190,200,201,204,223,-18,-31,-15,-3,-4,-41,-1,-38,-79,-57,-85,0,0,0,4,5,7,4,1,1,2,1,19,74,57,18,113,-135,30,-7,-9,-58,76,19,74,57,22,118,-128,34,-6,-8,-56,77,-1,0,-1,-1,-1,-2,-1,-1,0,0,0,511,511,511,511,511,511,509,511,509,509,509,509,10.179020565,10.744118776,10.784371501,10.390677742,9.5851342213,11.159659896,9.5690953661,7.2345598482,8.769051809,8.2619888643,12.013611481,11.62962307,10.961164476,10.625495318,11.996118903,11.218705716,11.813697983,11.919233848,12.169296388,13.350895049,-1.834590916,-0.885504295,-0.176792975,-0.234817576,-2.410984681,-0.05904582,-2.244602617,-4.684674,-3.400244579,-5.088906185,0,0,0.2357239672,0.2935219701,0.411631531,0.2361832782,0.0590684899,0.0592996709,0.1193068273,0.0598694845,4.3793460571,3.3649163198,1.0607578526,6.6335965247,-7.938608097,1.7713745867,-0.413479429,-0.533697038,-3.459897993,4.5500808238,4.3793460571,3.3649163198,1.2964818198,6.9271184948,-7.526976566,2.0075578649,-0.354410939,-0.474397367,-3.340591165,4.6099503083 +050,3,5,54,093,West Virginia,Tucker County,7141,7141,7129,7130,7079,7079,7050,7088,7056,6994,6957,6891,6816,-12,1,-51,0,-29,38,-32,-62,-37,-66,-75,21,60,57,76,62,69,71,77,54,52,54,19,94,93,83,92,75,95,89,91,99,136,2,-34,-36,-7,-30,-6,-24,-12,-37,-47,-82,0,0,0,0,0,0,0,0,0,0,0,-13,35,-14,7,3,43,-7,-49,0,-19,7,-13,35,-14,7,3,43,-7,-49,0,-19,7,-1,0,-1,0,-2,1,-1,-1,0,0,0,142,142,200,187,186,186,186,181,196,181,181,181,8.415737429,8.0230839609,10.735979658,8.7762757449,9.7609279955,10.03959276,10.960854093,7.7413805462,7.5101097631,7.8791858175,13.184655305,13.090294884,11.72481989,13.022860783,10.609704343,13.433257919,12.669039146,13.045659809,14.298093588,19.843875392,-4.768917876,-5.067210923,-0.988840232,-4.246585038,-0.848776347,-3.393665158,-1.708185053,-5.304279263,-6.787983824,-11.96468957,0,0,0,0,0,0,0,0,0,0,4.9091801669,-1.970582025,0.9888402317,0.4246585038,6.0828971566,-0.989819005,-6.975088968,0,-2.744078567,1.0213759393,4.9091801669,-1.970582025,0.9888402317,0.4246585038,6.0828971566,-0.989819005,-6.975088968,0,-2.744078567,1.0213759393 +050,3,5,54,095,West Virginia,Tyler County,9208,9227,9215,9117,9052,9005,9084,8959,8972,8803,8749,8622,8533,-12,-98,-65,-47,79,-125,13,-169,-54,-127,-89,21,74,92,103,88,88,94,77,92,80,80,13,161,126,117,116,118,119,111,115,109,117,8,-87,-34,-14,-28,-30,-25,-34,-23,-29,-37,0,0,0,0,0,6,7,5,-1,9,7,-21,-10,-31,-31,104,-102,31,-140,-30,-107,-58,-21,-10,-31,-31,104,-96,38,-135,-31,-98,-51,1,-1,0,-2,3,1,0,0,0,0,-1,67,67,67,67,67,67,67,67,67,67,67,67,8.0733144229,10.127139633,11.408318104,9.7296699652,9.7544754198,10.484635547,8.6638537271,10.483135825,9.2107535548,9.3267269018,17.564913812,13.869778194,12.958963283,12.825474045,13.079864767,13.273102448,12.489451477,13.103919781,12.549651718,13.640338094,-9.491599389,-3.74263856,-1.550645179,-3.09580408,-3.325389348,-2.788466901,-3.82559775,-2.620783956,-3.338898164,-4.313611192,0,0,0,0,0.6650778695,0.7807707323,0.5625879044,-0.113947129,1.0362097749,0.8160886039,-1.090988436,-3.412405746,-3.433571468,11.498700868,-11.30632378,3.4576989571,-15.75246132,-3.418413856,-12.31938288,-6.761877004,-1.090988436,-3.412405746,-3.433571468,11.498700868,-10.64124591,4.2384696894,-15.18987342,-3.532360985,-11.2831731,-5.9457884 +050,3,5,54,097,West Virginia,Upshur County,24254,24260,24242,24279,24456,24619,24686,24756,24699,24589,24424,24315,24230,-18,37,177,163,67,70,-57,-110,-165,-109,-85,65,256,277,313,265,269,261,260,232,258,242,82,261,254,257,267,248,305,275,287,268,304,-17,-5,23,56,-2,21,-44,-15,-55,-10,-62,0,-2,-6,2,6,22,20,9,4,20,15,2,44,159,107,68,30,-32,-103,-112,-119,-38,2,42,153,109,74,52,-12,-94,-108,-99,-23,-3,0,1,-2,-5,-3,-1,-1,-2,0,0,1215,1215,1215,1215,1215,1217,1223,1222,1224,1225,1225,1225,10.552132067,11.367600287,12.755985736,10.749416895,10.881436835,10.555050045,10.550235351,9.4668761349,10.587004247,9.9701308065,10.758228396,10.423720119,10.473764646,10.83054457,10.031956636,12.334445455,11.158902776,11.711178667,10.997353249,12.52446184,-0.206096329,0.9438801683,2.2822210902,-0.081127675,0.849480199,-1.77939541,-0.608667424,-2.244302532,-0.410349002,-2.554331033,-0.082438532,-0.246229609,0.0815078961,0.243383024,0.8899316371,0.8088160954,0.3652004545,0.1632220023,0.8206980037,0.6179833145,1.8136476989,6.5250846414,4.3606724401,2.7583409391,1.2135431415,-1.294105753,-4.179516312,-4.570216065,-4.883153122,-1.56555773,1.7312091672,6.2788550323,4.4421803362,3.0017239631,2.1034747785,-0.485289657,-3.814315858,-4.406994063,-4.062455118,-0.947574415 +050,3,5,54,099,West Virginia,Wayne County,42481,42542,42501,42234,41933,41890,41574,41272,40807,40301,40046,39552,39054,-41,-267,-301,-43,-316,-302,-465,-506,-255,-494,-498,98,382,387,477,467,419,435,406,346,337,327,93,492,447,470,489,535,515,536,563,510,582,5,-110,-60,7,-22,-116,-80,-130,-217,-173,-255,2,13,10,-4,0,-1,9,13,-2,26,20,-44,-169,-253,-39,-297,-183,-395,-389,-34,-346,-263,-42,-156,-243,-43,-297,-184,-386,-376,-36,-320,-243,-4,-1,2,-7,3,-2,1,0,-2,-1,0,246,246,246,246,246,246,246,246,246,246,246,246,9.0163450758,9.1960031841,11.381124512,11.190453369,10.115153417,10.599544341,10.011342901,8.6126426625,8.4675494359,8.3199755744,11.61267481,10.621740112,11.214105914,11.717626761,12.91553002,12.54888583,13.216945307,14.01421335,12.814392321,14.808029921,-2.596329734,-1.425736928,0.1670185987,-0.527173392,-2.800376602,-1.949341488,-3.205602407,-5.401570687,-4.346842885,-6.488054347,0.3068389685,0.2376228213,-0.095439199,0,-0.024141178,0.2193009174,0.3205602407,-0.049784062,0.6532827458,0.5088670076,-3.988906591,-6.011857379,-0.930532193,-7.116840794,-4.417835502,-9.624873597,-9.59214874,-0.846329048,-8.693685771,-6.69160115,-3.682067623,-5.774234557,-1.025971392,-7.116840794,-4.44197668,-9.40557268,-9.271588499,-0.896113109,-8.040403025,-6.182734142 +050,3,5,54,101,West Virginia,Webster County,9154,9148,9151,9123,8981,8832,8750,8635,8554,8349,8304,8179,8058,3,-28,-142,-149,-82,-115,-81,-205,-45,-125,-121,27,109,106,88,98,90,79,82,87,80,82,40,102,126,136,115,128,129,125,125,115,128,-13,7,-20,-48,-17,-38,-50,-43,-38,-35,-46,1,6,5,2,0,0,0,0,0,0,0,15,-41,-127,-104,-65,-78,-30,-162,-6,-90,-75,16,-35,-122,-102,-65,-78,-30,-162,-6,-90,-75,0,0,0,1,0,1,-1,0,-1,0,0,58,58,58,58,58,58,58,58,58,58,58,58,11.929517347,11.710119311,9.8804244091,11.147764759,10.353753236,9.1919250684,9.7024196888,10.448567826,9.7069708184,10.100388003,11.163401554,13.919575784,15.269746814,13.081560687,14.725337935,15.009599162,14.790273916,15.012310094,13.953770551,15.766459321,0.7661157929,-2.209456474,-5.389322405,-1.933795928,-4.371584699,-5.817674094,-5.087854227,-4.563742269,-4.246799733,-5.666071319,0.6566706797,0.5523641184,0.2245551002,0,0,0,0,0,0,0,-4.487249644,-14.03004861,-11.67686521,-7.393925606,-8.973252804,-3.490604456,-19.16819499,-0.720590885,-10.92034217,-9.238159759,-3.830578965,-13.47768449,-11.45231011,-7.393925606,-8.973252804,-3.490604456,-19.16819499,-0.720590885,-10.92034217,-9.238159759 +050,3,5,54,103,West Virginia,Wetzel County,16583,16566,16537,16370,16345,16114,15962,15783,15673,15444,15302,15130,14904,-29,-167,-25,-231,-152,-179,-110,-229,-142,-172,-226,36,172,173,170,153,182,193,145,181,158,168,65,215,238,227,209,225,188,231,243,242,255,-29,-43,-65,-57,-56,-43,5,-86,-62,-84,-87,1,7,1,0,-1,0,6,1,0,5,5,1,-132,44,-177,-96,-136,-122,-144,-80,-93,-144,2,-125,45,-177,-97,-136,-116,-143,-80,-88,-139,-2,1,-5,3,1,0,1,0,0,0,0,124,124,124,124,124,124,124,124,124,124,124,124,10.45370286,10.576188293,10.474752765,9.5398428732,11.466372657,12.27110885,9.3196644921,11.773889286,10.383806519,11.187321036,13.067128574,14.549900657,13.986875751,13.031550069,14.175460702,11.953204476,14.847189639,15.806934235,15.904311251,16.980755144,-2.613425715,-3.973712364,-3.512122986,-3.491707195,-2.709088045,0.3179043744,-5.527525147,-4.033044949,-5.520504732,-5.793434108,0.4254413954,0.0611340364,0,-0.062351914,0,0.3814852492,0.0642735482,0,0.3286014721,0.3329559832,-8.022609171,2.6898976005,-10.90606611,-5.985783764,-8.568278469,-7.756866734,-9.255390944,-5.203928966,-6.111987382,-9.589132317,-7.597167776,2.7510316369,-10.90606611,-6.048135678,-8.568278469,-7.375381485,-9.191117396,-5.203928966,-5.78338591,-9.256176333 +050,3,5,54,105,West Virginia,Wirt County,5717,5710,5721,5751,5770,5834,5786,5798,5759,5781,5794,5783,5705,11,30,19,64,-48,12,-39,22,13,-11,-78,24,58,55,60,58,57,54,60,54,49,52,23,60,62,50,66,74,53,60,70,58,58,1,-2,-7,10,-8,-17,1,0,-16,-9,-6,0,8,0,0,0,0,0,0,0,0,0,11,23,27,55,-40,31,-41,22,31,-2,-71,11,31,27,55,-40,31,-41,22,31,-2,-71,-1,1,-1,-1,0,-2,1,0,-2,0,-1,0,0,0,0,0,0,0,0,0,0,0,0,10.111576011,9.5477823106,10.341261634,9.982788296,9.841160221,9.3449857229,10.398613518,9.3304535637,8.4650600328,9.0529247911,10.460251046,10.762954605,8.6177180283,11.359724613,12.776243094,9.1719304318,10.398613518,12.095032397,10.019866978,10.097493036,-0.348675035,-1.215172294,1.7235436057,-1.376936317,-2.935082873,0.1730552912,0,-2.764578834,-1.554806945,-1.044568245,1.3947001395,0,0,0,0,0,0,0,0,0,4.009762901,4.6870931343,9.4794898311,-6.884681583,5.3522099448,-7.095266938,3.8128249567,5.3563714903,-0.345512654,-12.36072423,5.4044630404,4.6870931343,9.4794898311,-6.884681583,5.3522099448,-7.095266938,3.8128249567,5.3563714903,-0.345512654,-12.36072423 +050,3,5,54,107,West Virginia,Wood County,86956,86954,86976,86913,86655,86577,86533,86410,85824,85163,84343,83668,82938,22,-63,-258,-78,-44,-123,-586,-661,-820,-675,-730,262,994,887,989,1043,990,990,900,935,892,870,275,1048,987,1012,1038,1128,1098,1085,1091,1132,1159,-13,-54,-100,-23,5,-138,-108,-185,-156,-240,-289,-2,15,8,-9,-8,5,10,-4,-11,0,3,46,-19,-149,-33,-19,22,-486,-470,-655,-435,-445,44,-4,-141,-42,-27,27,-476,-474,-666,-435,-442,-9,-5,-17,-13,-22,-12,-2,-2,2,0,1,1046,1046,1046,999,1000,1002,995,1001,1006,1009,1008,1007,11.432580554,10.220778024,11.418213725,12.050141529,11.448858873,11.495988016,10.527116097,11.032057862,10.61835237,10.443801544,12.053666419,11.373064159,11.683753579,11.992374791,13.044760412,12.7500958,12.691023294,12.872700671,13.475308164,13.913064355,-0.621085865,-1.152286136,-0.265539854,0.0577667379,-1.59590154,-1.254107784,-2.163907198,-1.840642809,-2.856955795,-3.469262812,0.1725238514,0.0921828909,-0.103906899,-0.092426781,0.0578225196,0.1161210911,-0.046787183,-0.129788916,0,0.0360131088,-0.218530212,-1.716906342,-0.380991965,-0.219513604,0.2544190861,-5.643485026,-5.497493962,-7.72834,-5.178232378,-5.341944468,-0.04600636,-1.624723451,-0.484898864,-0.311940385,0.3122416056,-5.527363935,-5.544281144,-7.858128916,-5.178232378,-5.305931359 +050,3,5,54,109,West Virginia,Wyoming County,23796,23804,23728,23462,23213,22943,22582,22179,21777,21275,20828,20449,20123,-76,-266,-249,-270,-361,-403,-402,-502,-447,-379,-326,54,272,244,230,220,217,202,207,191,166,168,100,352,333,332,323,322,340,317,338,343,373,-46,-80,-89,-102,-103,-105,-138,-110,-147,-177,-205,0,0,0,0,0,0,3,1,0,1,1,-28,-187,-163,-165,-266,-302,-267,-395,-302,-202,-123,-28,-187,-163,-165,-266,-302,-264,-394,-302,-201,-122,-2,1,3,-3,8,4,0,2,2,-1,1,56,56,56,56,56,56,56,56,56,56,56,56,11.527866073,10.455275844,9.9662015773,9.6650192202,9.6959406626,9.191009191,9.6162779894,9.0729876731,8.0432201953,8.281573499,14.918414918,14.268880557,14.38599532,14.190005491,14.387524854,15.47001547,14.726377404,16.055863003,16.619424861,18.387064971,-3.390548845,-3.813604713,-4.419793743,-4.524986271,-4.691584192,-6.279006279,-5.110099415,-6.98287533,-8.576204666,-10.10549147,0,0,0,0,0,0.1365001365,0.0464554492,0,0.0484531337,0.0492950804,-7.925407925,-6.984467059,-7.149666349,-11.68588688,-13.49388977,-12.14851215,-18.34990244,-14.34577109,-9.787533009,-6.063294883,-7.925407925,-6.984467059,-7.149666349,-11.68588688,-13.49388977,-12.01201201,-18.30344699,-14.34577109,-9.739079875,-6.013999803 +040,2,3,55,000,Wisconsin,Wisconsin,5686986,5687285,5690538,5705840,5720825,5738012,5753199,5762927,5775170,5793147,5809319,5824581,5832655,3253,15302,14985,17187,15187,9728,12243,17977,16172,15262,8074,17549,67784,67672,66899,67101,67155,66843,65869,64434,63774,63122,11771,48473,47867,50034,49332,51257,51341,52407,53500,51828,54407,5778,19311,19805,16865,17769,15898,15502,13462,10934,11946,8715,1244,4390,6073,8235,7986,9310,8141,8239,6011,4466,4287,-3448,-8323,-10533,-7471,-10005,-15148,-11257,-3512,-653,-1182,-5055,-2204,-3933,-4460,764,-2019,-5838,-3116,4727,5358,3284,-768,-321,-76,-360,-442,-563,-332,-143,-212,-120,32,127,150520,150528,149364,149407,148824,149071,148177,146364,145042,144685,144144,142304,11.895709321,11.844575823,11.676403111,11.678664677,11.66277618,11.586486056,11.387827633,11.106949161,10.963477424,10.829668371,8.5067378425,8.3781225756,8.7328234096,8.5860402354,8.9017782542,8.899387828,9.0604363625,9.2221774233,8.9098238768,9.3344597296,3.3889714785,3.4664532477,2.9435797018,3.0926244414,2.7609979259,2.6870982277,2.3273912705,1.8847717373,2.053653547,1.4952086412,0.770420216,1.0629523137,1.4373186389,1.3899318357,1.6168631708,1.4111512496,1.4244077164,1.0361590372,0.7677562984,0.735508829,-1.460639512,-1.843582533,-1.303971773,-1.741330831,-2.630745791,-1.951274981,-0.607175616,-0.112562278,-0.203199271,-0.867272482,-0.690219296,-0.780630219,0.1333468658,-0.351398995,-1.01388262,-0.540123731,0.8172321004,0.9235967595,0.5645570273,-0.131763653 +050,2,3,55,001,Wisconsin,Adams County,20875,20867,20878,20767,20411,20407,20120,20027,19984,19905,20386,20268,20498,11,-111,-356,-4,-287,-93,-43,-79,481,-118,230,35,120,122,145,132,140,126,128,120,135,133,42,263,229,255,285,232,275,258,260,275,268,-7,-143,-107,-110,-153,-92,-149,-130,-140,-140,-135,-1,-2,3,6,4,11,14,12,15,8,8,18,34,-254,100,-134,-12,93,40,604,16,360,17,32,-251,106,-130,-1,107,52,619,24,368,1,0,2,0,-4,0,-1,-1,2,-2,-3,1432,1432,1447,1343,1341,1314,1254,1157,1105,1213,1029,1114,5.7629967583,5.9254941959,7.1047087069,6.5141757347,6.9743691932,6.2982679763,6.4178094211,5.9566652602,6.6414128991,6.525045381,12.630567895,11.122444024,12.494487726,14.064697609,11.557526092,13.74621979,12.935897114,12.906108064,13.528804054,13.148211745,-6.867571137,-5.196949828,-5.389779019,-7.550521874,-4.583156898,-7.447951813,-6.518087693,-6.949442804,-6.887391155,-6.623166364,-0.096049946,0.1457088737,0.2939879465,0.1973992647,0.5479861509,0.6998075529,0.6016696332,0.7445831575,0.3935652088,0.3924839327,1.6328490815,-12.33668464,4.8997991082,-6.612875367,-0.597803074,4.6487216016,2.0055654441,29.98188181,0.7871304177,17.661776971,1.5367991356,-12.19097576,5.1937870547,-6.415476102,-0.049816923,5.3485291545,2.6072350773,30.726464967,1.1806956265,18.054260904 +050,2,3,55,003,Wisconsin,Ashland County,16157,16157,16142,16025,15835,15968,15996,15808,15637,15507,15553,15506,15415,-15,-117,-190,133,28,-188,-171,-130,46,-47,-91,37,181,178,185,186,179,179,173,174,164,158,62,200,162,181,191,204,176,189,209,179,190,-25,-19,16,4,-5,-25,3,-16,-35,-15,-32,0,-1,8,12,9,4,8,10,6,7,6,11,-97,-219,116,28,-169,-182,-124,77,-39,-67,11,-98,-211,128,37,-165,-174,-114,83,-32,-61,-1,0,5,1,-4,2,0,0,-2,0,2,623,623,599,572,634,616,610,568,590,623,576,578,11.253769391,11.17388575,11.634122567,11.638092854,11.25644573,11.384957863,11.109684048,11.204121056,10.560546058,10.219591863,12.435104299,10.169491525,11.382573971,11.950944813,12.828575022,11.194148513,12.137169278,13.457823567,11.52644966,12.28938262,-1.181334908,1.0043942247,0.251548596,-0.312851958,-1.572129292,0.1908093497,-1.02748523,-2.253702511,-0.965903603,-2.069790757,-0.062175521,0.5021971124,0.7546457881,0.5631335252,0.2515406867,0.5088249324,0.6421782687,0.3863490019,0.4507550146,0.388085767,-6.031025585,-13.74764595,7.2949092853,1.7519709673,-10.62759401,-11.57576721,-7.963010532,4.9581455248,-2.511349367,-4.333624398,-6.093201107,-13.24544884,8.0495550734,2.3151044926,-10.37605333,-11.06694228,-7.320832263,5.3444945267,-2.060594353,-3.945538631 +050,2,3,55,005,Wisconsin,Barron County,45870,45876,45816,45892,45784,45585,45355,45375,45271,45201,45123,45226,45090,-60,76,-108,-199,-230,20,-104,-70,-78,103,-136,131,521,572,514,492,518,494,469,504,495,483,145,510,500,505,492,489,501,513,547,528,534,-14,11,72,9,0,29,-7,-44,-43,-33,-51,6,21,28,36,27,28,36,51,30,40,31,-49,47,-202,-243,-260,-30,-132,-73,-63,97,-117,-43,68,-174,-207,-233,-2,-96,-22,-33,137,-86,-3,-3,-6,-1,3,-7,-1,-4,-2,-1,1,681,681,677,677,652,633,595,605,598,617,658,581,11.362149431,12.478729438,11.251080782,10.820321091,11.418494434,10.899543278,10.367848616,11.159824631,10.957509214,10.695779264,11.1222576,10.907980278,11.054077422,10.820321091,10.779235093,11.053990248,11.340525245,12.111952526,11.688009829,11.825147261,0.2398918306,1.5707491601,0.19700336,0,0.6392593409,-0.15444697,-0.972676629,-0.952127895,-0.730500614,-1.129367997,0.4579753129,0.6108468956,0.78801344,0.5937981086,0.6172159154,0.7942987004,1.1274206384,0.6642752757,0.88545529,0.6864785863,1.0249923671,-4.406824032,-5.31909072,-5.718055861,-0.661302766,-2.912428568,-1.613758953,-1.394978079,2.1472290784,-2.590903052,1.48296768,-3.795977137,-4.53107728,-5.124257752,-0.044086851,-2.118129868,-0.486338315,-0.730702803,3.0326843684,-1.904424465 +050,2,3,55,007,Wisconsin,Bayfield County,15014,15008,15001,15061,15060,15115,14975,14980,14926,15013,15086,15172,15242,-7,60,-1,55,-140,5,-54,87,73,86,70,30,121,139,115,121,133,116,107,141,129,130,57,143,136,160,164,153,192,153,167,158,188,-27,-22,3,-45,-43,-20,-76,-46,-26,-29,-58,0,7,4,8,6,4,4,5,2,4,3,21,75,-5,93,-100,22,19,129,98,111,127,21,82,-1,101,-94,26,23,134,100,115,130,-1,0,-3,-1,-3,-1,-1,-1,-1,0,-2,126,126,116,111,101,109,98,108,110,115,123,113,8.0500299381,9.2294412536,7.6222038111,8.0425390495,8.8799866466,7.7576406072,7.1478673302,9.3690820293,8.5266706326,8.5486946801,9.5136717451,9.0302446798,10.604805302,10.900631439,10.215322984,12.840232729,10.220782257,11.096714177,10.443519069,12.362727691,-1.463641807,0.1991965738,-2.982601491,-2.858092389,-1.335336338,-5.082592122,-3.072914927,-1.727632147,-1.916848437,-3.814033011,0.4657042113,0.2655954318,0.5302402651,0.3988035892,0.2670672676,0.2675048485,0.3340124921,0.1328947806,0.2643928878,0.1972775695,4.9896879782,-0.33199429,6.164043082,-6.646726487,1.4688699716,1.2706480305,8.6175222953,6.5118442473,7.3369026373,8.3514171105,5.4553921895,-0.066398858,6.6942833471,-6.247922898,1.7359372392,1.538152879,8.9515347874,6.6447390279,7.6012955252,8.5486946801 +050,2,3,55,009,Wisconsin,Brown County,248007,248006,248474,250496,252700,254249,256254,257916,259588,261714,262985,263899,264610,468,2022,2204,1549,2005,1662,1672,2126,1271,914,711,879,3345,3453,3388,3483,3327,3405,3290,3263,3119,3101,416,1780,1839,1854,1756,2018,1987,2089,2058,2020,2062,463,1565,1614,1534,1727,1309,1418,1201,1205,1099,1039,79,274,313,376,391,413,365,342,434,98,155,-52,193,334,-328,-64,-31,-98,598,-365,-291,-499,27,467,647,48,327,382,267,940,69,-193,-344,-22,-10,-57,-33,-49,-29,-13,-15,-3,8,16,6629,6629,6707,6673,6677,6539,6547,6522,6541,6526,6541,6397,13.407619697,13.724274438,13.366236051,13.645365453,12.941245113,13.159318575,12.622242002,12.437607085,11.839418164,11.7348995,7.1346974768,7.3092790881,7.31434523,6.8794894447,7.8495439252,7.6791676973,8.014548189,7.8444975119,7.6677219274,7.8030837696,6.2729222198,6.4149953497,6.0518908214,6.7658760086,5.0917011883,5.4801508781,4.6076938128,4.5931095733,4.1716962367,3.9318157307,1.0982624206,1.2440480449,1.4833839301,1.5318225358,1.6064725674,1.410617116,1.3120993205,1.6542817882,0.3719983905,0.5865557635,0.7735936028,1.3275145271,-1.294015769,-0.2507331,-0.120582687,-0.378741034,2.2942555371,-1.391273854,-1.104607466,-1.888331135,1.8718560234,2.571562572,0.1893681613,1.2810894353,1.4858898808,1.0318760821,3.6063548576,0.2630079341,-0.732609075,-1.301775372 +050,2,3,55,011,Wisconsin,Buffalo County,13587,13588,13551,13441,13344,13367,13234,13245,13148,13115,13126,13012,13033,-37,-110,-97,23,-133,11,-97,-33,11,-114,21,33,129,144,158,124,153,165,122,133,116,122,52,147,116,118,138,112,121,137,143,127,134,-19,-18,28,40,-14,41,44,-15,-10,-11,-12,0,0,5,2,5,7,5,6,11,4,1,-18,-91,-133,-17,-125,-37,-146,-23,11,-107,32,-18,-91,-128,-15,-120,-30,-141,-17,22,-103,33,0,-1,3,-2,1,0,0,-1,-1,0,0,107,107,100,104,116,115,111,92,95,80,80,87,9.5583876704,10.752286728,11.830332073,9.3229577835,11.556327656,12.503315273,9.2906370179,10.136808811,8.8759660265,9.3684008447,10.892116183,8.6615643084,8.835311295,10.375549791,8.4595339703,9.1690978669,10.432928454,10.898974887,9.71765246,10.289882895,-1.333728512,2.0907224193,2.995020778,-1.052592008,3.0967936856,3.3342174061,-1.142291437,-0.762166076,-0.841686434,-0.92148205,0,0.3733432892,0.1497510389,0.3759257171,0.5287208731,0.3788883416,0.4569165746,0.8383826836,0.306067794,0.0767901709,-6.742738589,-9.930931492,-1.272883831,-9.398142927,-2.794667472,-11.06353957,-1.751513536,0.8383826836,-8.18731349,2.4572854675,-6.742738589,-9.557588202,-1.123132792,-9.02221721,-2.265946599,-10.68465123,-1.294596962,1.6767653672,-7.881245696,2.5340756383 +050,2,3,55,013,Wisconsin,Burnett County,15457,15459,15430,15464,15339,15266,15229,15140,15235,15297,15334,15390,15557,-29,34,-125,-73,-37,-89,95,62,37,56,167,31,141,137,127,116,136,155,124,124,119,117,52,140,172,176,191,189,185,195,206,175,182,-21,1,-35,-49,-75,-53,-30,-71,-82,-56,-65,0,4,4,5,2,2,2,1,0,1,0,-7,31,-94,-25,34,-35,124,131,118,112,234,-7,35,-90,-20,36,-33,126,132,118,113,234,-1,-2,0,-4,2,-3,-1,1,1,-1,-2,139,139,139,138,138,134,134,134,134,134,138,135,9.1279860167,8.8952374769,8.2992975004,7.6078045581,8.9565016958,10.205761317,8.1226254422,8.0963729555,7.7463871892,7.5613145054,9.0632485272,11.167743402,11.501388662,12.526643712,12.446903092,12.181069959,12.773483558,13.450426039,11.391745866,11.762044786,0.0647374895,-2.272505925,-3.202091162,-4.918839154,-3.490401396,-1.975308642,-4.650858116,-5.354053083,-3.645358677,-4.200730281,0.2589499579,0.2597149628,0.3267439961,0.1311690441,0.1317132602,0.1316872428,0.0655050439,0,0.0650956907,0,2.0068621739,-6.103301626,-1.63371998,2.2298737498,-2.304982054,8.1646090535,8.5811607494,7.7046129738,7.2907173545,15.122629011,2.2658121318,-5.843586664,-1.306975984,2.3610427939,-2.173268794,8.2962962963,8.6466657933,7.7046129738,7.3558130452,15.122629011 +050,2,3,55,015,Wisconsin,Calumet County,48971,48981,49041,49623,49653,49649,49480,49823,49606,49988,50111,50112,50209,60,582,30,-4,-169,343,-217,382,123,1,97,156,592,600,545,519,540,497,490,471,484,477,53,278,297,305,388,289,359,363,391,340,373,103,314,303,240,131,251,138,127,80,144,104,2,8,19,18,19,26,11,12,9,8,9,-43,261,-296,-264,-323,72,-366,246,35,-150,-17,-41,269,-277,-246,-304,98,-355,258,44,-142,-8,-2,-1,4,2,4,-6,0,-3,-1,-1,1,198,198,202,199,194,182,191,179,176,163,155,167,12.000324333,12.087513598,10.976616785,10.471204188,10.875804356,9.9970833459,9.8399501978,9.4106834234,9.6584616306,9.5094745866,5.6352874402,5.9833192312,6.1428772834,7.8281834781,5.8205693685,7.2212332418,7.2895957588,7.8122658568,6.7848697405,7.4361300226,6.3650368929,6.1041943672,4.8337395017,2.6430207104,5.0552349879,2.7758501041,2.550354439,1.5984175666,2.8735918901,2.0733445639,0.162166545,0.382771264,0.3625304626,0.3833388817,0.5236498394,0.2212634141,0.2409783722,0.1798219762,0.1596439939,0.1794240488,5.290683532,-5.963173375,-5.317113452,-6.516760988,1.4501072475,-7.362037233,4.9400566299,0.6993076854,-2.993324886,-0.338912092,5.452850077,-5.580402111,-4.954582989,-6.133422107,1.9737570869,-7.140773819,5.1810350021,0.8791296616,-2.833680892,-0.159488043 +050,2,3,55,017,Wisconsin,Chippewa County,62415,62510,62646,62958,63063,63102,63349,63438,63577,63774,64095,64692,64737,136,312,105,39,247,89,139,197,321,597,45,170,762,770,698,700,728,741,657,645,685,689,86,508,499,571,586,628,632,577,597,595,641,84,254,271,127,114,100,109,80,48,90,48,4,1,5,15,14,12,6,6,0,5,3,53,59,-164,-93,133,-17,30,115,273,503,-8,57,60,-159,-78,147,-5,36,121,273,508,-5,-5,-2,-7,-10,-14,-6,-6,-4,0,-1,2,2632,2632,2633,2631,2576,2656,2608,2639,2652,2696,2701,2723,12.133371549,12.220185525,11.064875362,11.071482234,11.483827206,11.667913239,10.317940181,10.088449898,10.637719646,10.646763863,8.0889143658,7.9193150348,9.0516387271,9.2684122704,9.9063784142,9.951580522,9.0615699916,9.3376815334,9.2400630498,9.9050444645,4.0444571829,4.3008704898,2.0132366346,1.8030699639,1.5774487921,1.7163327166,1.2563701895,0.7507683645,1.3976565958,0.7417193983,0.0159230598,0.0793518541,0.2377838545,0.2214296447,0.189293855,0.0944770303,0.0942277642,0,0.0776475887,0.0463574624,0.9394605267,-2.602740813,-1.474259898,2.1035816245,-0.268166295,0.4723851514,1.8060321474,4.2699950731,7.8113474186,-0.1236199,0.9553835865,-2.523388959,-1.236476043,2.3250112692,-0.07887244,0.5668621816,1.9002599116,4.2699950731,7.8889950073,-0.077262437 +050,2,3,55,019,Wisconsin,Clark County,34690,34679,34670,34670,34433,34529,34348,34350,34512,34588,34737,34785,34720,-9,0,-237,96,-181,2,162,76,149,48,-65,152,581,560,593,558,539,605,575,564,576,579,118,320,314,334,361,341,335,346,356,332,338,34,261,246,259,197,198,270,229,208,244,241,2,3,15,4,6,11,27,32,49,11,15,-46,-263,-510,-171,-387,-207,-133,-184,-107,-208,-320,-44,-260,-495,-167,-381,-196,-106,-152,-58,-197,-305,1,-1,12,4,3,0,-2,-1,-1,1,-1,536,536,534,512,528,488,491,510,481,464,476,466,16.758004038,16.20768997,17.197877092,16.202796289,15.691868759,17.571374633,16.642547033,16.271186441,16.570294295,16.660671894,9.2298817421,9.0878833046,9.6864940112,10.48245423,9.9275088067,9.7296041358,10.01447178,10.2704652,9.5509335174,9.7259189986,7.5281222959,7.1198066654,7.5113830805,5.720342059,5.7643599523,7.8417704975,6.6280752533,6.0007212405,7.0193607779,6.9347528955,0.0865301413,0.4341345528,0.1160059163,0.174223616,0.3202422196,0.7841770498,0.9261939219,1.4136314461,0.3164465924,0.4316236242,-7.585809057,-14.76057479,-4.959252922,-11.23742323,-6.026376314,-3.86279806,-5.325615051,-3.086909484,-5.983717384,-9.20797065,-7.499278915,-14.32644024,-4.843247006,-11.06319962,-5.706134094,-3.07862101,-4.399421129,-1.673278038,-5.667270792,-8.776347025 +050,2,3,55,021,Wisconsin,Columbia County,56833,56856,56854,56712,56476,56577,56645,56683,56907,57267,57275,57537,57668,-2,-142,-236,101,68,38,224,360,8,262,131,137,628,578,626,615,571,622,600,580,606,592,153,513,513,510,554,561,555,515,597,523,575,-16,115,65,116,61,10,67,85,-17,83,17,0,4,12,25,25,29,40,32,17,22,16,20,-259,-316,-38,-5,6,120,244,11,156,95,20,-255,-304,-13,20,35,160,276,28,178,111,-6,-2,3,-2,-13,-7,-3,-1,-3,1,3,1526,1526,1484,1477,1414,1430,1460,1411,1424,1414,1362,1362,11.059648134,10.213096795,11.074451806,10.863613079,10.076944797,10.951668281,10.510273793,10.127289553,10.556387834,10.277331713,9.0343940968,9.0645651482,9.0223169664,9.7860839766,9.9004659043,9.7719869707,9.0213183387,10.424123902,9.110545936,9.9822056334,2.0252540373,1.1485316465,2.0521348394,1.0775291021,0.1764788931,1.17968131,1.488955454,-0.296834349,1.4458418981,0.2951260796,0.0704436187,0.2120366117,0.4422704395,0.4416102878,0.5117887901,0.7042873492,0.5605479356,0.296834349,0.3832352019,0.277765722,-4.56122431,-5.583630774,-0.672251068,-0.088322058,0.1058873359,2.1128620477,4.274178009,0.1920692846,2.7174859771,1.6492339742,-4.490780691,-5.371594162,-0.229980629,0.3532882302,0.6176761259,2.817149397,4.8347259446,0.4889036336,3.100721179,1.9269996962 +050,2,3,55,023,Wisconsin,Crawford County,16644,16639,16629,16673,16510,16384,16339,16315,16241,16182,16211,16121,16021,-10,44,-163,-126,-45,-24,-74,-59,29,-90,-100,52,144,174,159,175,142,165,168,141,166,154,45,180,196,172,167,165,175,177,181,160,191,7,-36,-22,-13,8,-23,-10,-9,-40,6,-37,0,2,1,5,7,8,5,6,1,3,1,-17,79,-142,-118,-58,-7,-68,-55,70,-98,-64,-17,81,-141,-113,-51,1,-63,-49,71,-95,-63,0,-1,0,0,-2,-2,-1,-1,-2,-1,0,785,785,785,783,781,765,775,771,769,763,766,759,8.6481292415,10.487297713,9.6674165501,10.695840846,8.6972499541,10.136380391,10.36301391,8.7055845399,10.268464679,9.582477755,10.810161552,11.813277883,10.457834255,10.206888122,10.105959454,10.750706475,10.918175369,11.175253913,9.8973153532,11.884761371,-2.16203231,-1.325980171,-0.790417705,0.4889527244,-1.4087095,-0.614326084,-0.555161459,-2.469669373,0.3711493257,-2.302283616,0.1201129061,0.0602718259,0.3040068098,0.4278336338,0.4899859129,0.3071630421,0.3701076396,0.0617417343,0.1855746629,0.0622238815,4.7444597922,-8.558599283,-7.17456071,-3.544907252,-0.428737674,-4.177417373,-3.392653363,4.3219214028,-6.062105654,-3.982328418,4.8645726983,-8.498327457,-6.8705539,-3.117073618,0.0612482391,-3.870254331,-3.022545724,4.3836631371,-5.876530991,-3.920104536 +050,2,3,55,025,Wisconsin,Dane County,488073,488091,489247,496121,503087,510026,516602,523399,531775,537901,542448,547637,552536,1156,6874,6966,6939,6576,6797,8376,6126,4547,5189,4899,1601,5982,6108,6144,6304,6184,6196,5984,5777,5733,5729,718,2981,2917,3164,3230,3225,3145,3330,3438,3348,3565,883,3001,3191,2980,3074,2959,3051,2654,2339,2385,2164,306,1235,1426,2077,1929,2460,2039,2085,1121,1464,1178,15,2626,2348,1876,1604,1403,3274,1390,1086,1314,1523,321,3861,3774,3953,3533,3863,5313,3475,2207,2778,2701,-48,12,1,6,-31,-25,12,-3,1,26,34,12775,12777,12731,12559,12791,12869,12871,12740,12788,12800,13097,13436,12.141656721,12.225682741,12.128953039,12.280982011,11.892296257,11.744034633,11.188434629,10.694692178,10.518445809,10.414725684,6.0505313751,5.8386241904,6.2460949568,6.2924447804,6.2019171135,5.96110215,6.2261843773,6.3646099547,6.1426402528,6.4807989289,6.0911253461,6.3870585504,5.882858082,5.9885372306,5.6903791439,5.7829324832,4.9622502515,4.3300822234,4.3758055564,3.9339267552,2.5066777082,2.8542605744,4.1002336363,3.7579337404,4.730764682,3.8647654321,3.8983767047,2.075255311,2.6860290711,2.1414813852,5.3299883901,4.69972218,3.7034368328,3.1247930117,2.6980743288,6.2056115863,2.5989178031,2.0104614342,2.4108211745,2.7686554751,7.8366660984,7.5539827543,7.8036704691,6.882726752,7.4288390107,10.070377018,6.4972945079,4.0857167452,5.0968502456,4.9101368603 +050,2,3,55,027,Wisconsin,Dodge County,88759,88744,88723,88392,88154,87953,88085,87838,87365,87724,87796,87626,87336,-21,-331,-238,-201,132,-247,-473,359,72,-170,-290,225,860,818,846,855,816,777,818,780,773,772,208,904,824,895,824,970,911,962,934,934,966,17,-44,-6,-49,31,-154,-134,-144,-154,-161,-194,12,34,45,26,14,24,23,29,23,14,15,-45,-320,-268,-170,107,-111,-359,479,207,-24,-113,-33,-286,-223,-144,121,-87,-336,508,230,-10,-98,-5,-1,-9,-8,-20,-6,-3,-5,-4,1,2,6192,6192,6118,6237,6312,6300,6276,6291,6358,6361,6278,6249,9.7112045846,9.266706694,9.6077952608,9.7138117906,9.2767858665,8.8697111351,9.343819429,8.8878760255,8.813033713,8.8247733794,10.208056912,9.3346776478,10.164275128,9.3616151058,11.027551827,10.399365308,10.988697177,10.642661805,10.648607358,11.042397778,-0.496852328,-0.067970954,-0.556479867,0.3521966848,-1.75076596,-1.529654173,-1.644877748,-1.754785779,-1.835573645,-2.217624398,0.383931344,0.5097821531,0.2952750317,0.1590565673,0.2728466431,0.2625525819,0.331260102,0.2620783956,0.1596150996,0.171465804,-3.613471473,-3.036035934,-1.930644438,1.2156466218,-1.261915724,-4.098103343,5.4715030642,2.3587055606,-0.273625885,-1.291709057,-3.229540129,-2.526253781,-1.635369406,1.3747031891,-0.989069081,-3.835550761,5.8027631662,2.6207839562,-0.114010785,-1.120243253 +050,2,3,55,029,Wisconsin,Door County,27785,27784,27749,27766,27538,27614,27478,27320,27354,27473,27638,27752,27889,-35,17,-228,76,-136,-158,34,119,165,114,137,58,203,209,197,212,210,233,210,219,204,203,59,303,319,350,313,357,340,362,333,316,364,-1,-100,-110,-153,-101,-147,-107,-152,-114,-112,-161,4,-2,6,3,1,6,7,8,6,5,2,-34,121,-124,225,-28,-13,136,264,272,223,300,-30,119,-118,228,-27,-7,143,272,278,228,302,-4,-2,0,1,-8,-4,-2,-1,1,-2,-4,348,348,348,338,342,342,340,337,341,340,340,339,7.3133387373,7.5582236366,7.1438932405,7.6962172366,7.6645133034,8.5232468815,7.6604592628,7.9475966685,7.3659505326,7.2967775561,10.915968657,11.536236077,12.692196113,11.362811297,13.029672616,12.437355964,13.205172634,12.084701784,11.410001805,13.083876997,-3.60262992,-3.97801244,-5.548302872,-3.666594061,-5.365159312,-3.914109083,-5.544713371,-4.137105115,-4.044051273,-5.787099441,-0.072052598,0.2169824967,0.1087902524,0.0363029115,0.2189860944,0.256063211,0.2918270195,0.2177423745,0.1805380032,0.0718894341,4.359182203,-4.484304933,8.1592689295,-1.016481522,-0.474469871,4.9749423858,9.6302916446,9.8709876431,8.0519949449,10.783415108,4.2871296046,-4.267322436,8.2680591819,-0.98017861,-0.255483777,5.2310055968,9.9221186642,10.088730018,8.2325329482,10.855304542 +050,2,3,55,031,Wisconsin,Douglas County,44159,44160,44137,43968,43770,43792,43686,43553,43471,43451,43353,43506,43702,-23,-169,-198,22,-106,-133,-82,-20,-98,153,196,117,468,479,425,417,398,447,421,404,414,401,124,443,400,425,424,387,442,405,430,422,438,-7,25,79,0,-7,11,5,16,-26,-8,-37,2,18,32,58,35,53,49,54,11,38,31,-12,-212,-311,-28,-128,-193,-135,-87,-81,122,202,-10,-194,-279,30,-93,-140,-86,-33,-70,160,233,-6,0,2,-8,-6,-4,-1,-3,-2,1,0,1372,1372,1327,1285,1344,1344,1348,1377,1419,1379,1350,1306,10.623687645,10.918872096,9.7074073228,9.5338256476,9.1243595181,10.27302813,9.6868456777,9.3083268052,9.5326909129,9.1964039996,10.056182964,9.1180560305,9.7074073228,9.6938658863,8.8721787274,10.158117301,9.3186995237,9.9073775402,9.7168975005,10.044950005,0.5675046819,1.800816066,0,-0.160040239,0.2521807907,0.1149108292,0.368146154,-0.599050735,-0.184206588,-0.848546005,0.408603371,0.7294444824,1.3247755876,0.8002011934,1.2150529007,1.1261261261,1.2424932698,0.2534445417,0.8749812915,0.7109439501,-4.812439703,-7.089288564,-0.639546835,-2.926450079,-4.4246266,-3.102592388,-2.001794713,-1.866273444,2.8091504622,4.6326025135,-4.403836332,-6.359844081,0.6852287522,-2.126248885,-3.2095737,-1.976466262,-0.759301443,-1.612828902,3.6841317538,5.3435464636 +050,2,3,55,033,Wisconsin,Dunn County,43857,43865,43888,43808,43818,44064,44100,44300,44389,44784,45135,45384,45452,23,-80,10,246,36,200,89,395,351,249,68,120,471,433,441,467,465,436,480,408,419,407,92,296,285,323,328,335,328,360,379,329,348,28,175,148,118,139,130,108,120,29,90,59,-1,10,37,60,52,75,59,67,27,45,38,0,-266,-170,76,-158,-1,-77,207,295,113,-31,-1,-256,-133,136,-106,74,-18,274,322,158,7,-4,1,-5,-8,3,-4,-1,1,0,1,2,3415,3415,3261,3308,3323,3269,3308,3270,3285,3261,3201,3282,10.741652983,9.8829114646,10.036184884,10.593893199,10.520361991,9.8321099573,10.765590481,9.0748340173,9.2577248975,8.9612048087,6.7505929575,6.5049186315,7.3507657996,7.4406787351,7.5791855204,7.3966331789,8.0741928611,8.4298090504,7.2691921033,7.6621603769,3.9910600255,3.3779928332,2.6854190847,3.153214464,2.9411764706,2.4354767784,2.6913976204,0.6450249669,1.9885327942,1.2990444317,0.2280605729,0.8444982083,1.3654673312,1.1796197995,1.6968325792,1.3304919438,1.5026970047,0.6005404864,0.9942663971,0.8366726848,-6.066411239,-3.880126903,1.7295919528,-3.584229391,-0.022624434,-1.73640474,4.6426608951,6.5614608703,2.4967133972,-0.682548769,-5.838350666,-3.035628695,3.095059284,-2.404609591,1.6742081448,-0.405912796,6.1453578998,7.1620013568,3.4909797943,0.1541239156 +050,2,3,55,035,Wisconsin,Eau Claire County,98736,98873,99012,99952,100862,101775,101745,102142,102989,103671,104276,104466,105260,139,940,910,913,-30,397,847,682,605,190,794,283,1132,1189,1176,1221,1232,1207,1207,1133,1127,1094,141,731,772,799,841,899,897,879,862,849,841,142,401,417,377,380,333,310,328,271,278,253,11,58,96,157,139,129,161,151,99,120,99,-4,478,405,381,-548,-53,379,207,239,-210,438,7,536,501,538,-409,76,540,358,338,-90,537,-10,3,-8,-2,-1,-12,-3,-4,-4,2,4,4938,4938,4969,4993,5009,4867,4769,4918,4892,4522,4383,4585,11.378942924,11.841803858,11.606962203,11.998820755,12.085125584,11.76808966,11.681021968,10.897007411,10.798018607,10.432659756,7.3480629662,7.6887069627,7.8860227895,8.2645440252,8.8186103087,8.7456308408,8.5067260234,8.2905740405,8.1344434757,8.0199879843,4.0308799582,4.1530968956,3.7209394138,3.7342767296,3.2665152756,3.022458819,3.174295945,2.60643337,2.663575131,2.4126717717,0.5830200438,0.9561086378,1.5495689336,1.3659591195,1.2654068185,1.5697286124,1.4613374625,0.9521656961,1.1497446609,0.9440889542,4.8048893267,4.0335833159,3.7604188771,-5.385220126,-0.519895825,3.6951996529,2.0032904287,2.29866264,-2.012053157,4.1768784032,5.3879093705,4.9896919537,5.3099878107,-4.019261006,0.7455109938,5.2649282654,3.4646278912,3.2508283361,-0.862308496,5.1209673574 +050,2,3,55,037,Wisconsin,Florence County,4423,4423,4398,4383,4369,4387,4347,4343,4322,4345,4295,4300,4298,-25,-15,-14,18,-40,-4,-21,23,-50,5,-2,5,27,30,27,31,22,32,35,28,28,25,23,56,45,52,40,50,64,70,73,51,57,-18,-29,-15,-25,-9,-28,-32,-35,-45,-23,-32,0,-2,0,0,0,0,0,0,0,0,0,-8,17,3,42,-31,24,12,58,-6,29,30,-8,15,3,42,-31,24,12,58,-6,29,30,1,-1,-2,1,0,0,-1,0,1,-1,0,59,59,52,57,55,54,54,53,57,48,55,54,6.1496412709,6.8555758684,6.1671996345,7.0986947561,5.0632911392,7.3860357761,8.076612438,6.4814814815,6.5154159395,5.8153058851,12.754811525,10.283363803,11.877569667,9.1596061369,11.507479862,14.772071552,16.153224876,16.898148148,11.867364747,13.258897418,-6.605170254,-3.427787934,-5.710370032,-2.060911381,-6.444188723,-7.386035776,-8.076612438,-10.41666667,-5.351948807,-7.443591533,-0.455528983,0,0,0,0,0,0,0,0,0,3.8719963558,0.6855575868,9.5934216537,-7.098694756,5.5235903337,2.769763416,13.384100612,-1.388888889,6.7481093659,6.9783670621,3.4164673727,0.6855575868,9.5934216537,-7.098694756,5.5235903337,2.769763416,13.384100612,-1.388888889,6.7481093659,6.9783670621 +050,2,3,55,039,Wisconsin,Fond du Lac County,101633,101626,101579,101822,101802,101808,101993,101970,102189,102324,102777,103079,102902,-47,243,-20,6,185,-23,219,135,453,302,-177,304,1097,1123,1126,1068,1075,1076,1084,1000,1088,1042,253,916,911,976,941,940,887,949,1015,966,998,51,181,212,150,127,135,189,135,-15,122,44,12,77,120,208,191,187,111,106,57,62,65,-108,-12,-346,-347,-124,-341,-77,-102,415,117,-290,-96,65,-226,-139,67,-154,34,4,472,179,-225,-2,-3,-6,-5,-9,-4,-4,-4,-4,1,4,3589,3589,3653,3597,3497,3520,3470,3530,3440,3546,3548,3311,10.786574304,11.030133972,11.060360493,10.480812165,10.541127557,10.540803981,10.600793104,9.7512932653,10.570495881,10.117438016,9.0068387078,8.9478646918,9.5869554541,9.2344983587,9.2173580502,8.6893058841,9.2805836304,9.8975626642,9.3852013058,9.690214146,1.7797355962,2.0822692806,1.473405039,1.2463138061,1.3237695072,1.8514980971,1.3202094732,-0.146269399,1.1852945748,0.4272238702,0.7571250879,1.178642989,2.0431216541,1.8743774564,1.83366591,1.0873877713,1.0366089197,0.5558237161,0.6023628167,0.6311261718,-0.11799352,-3.398420618,-3.40847699,-1.216873323,-3.343743718,-0.75431404,-0.997491602,4.0467867051,1.1367169283,-2.81579369,0.6391315677,-2.219777629,-1.365355336,0.6575041339,-1.510077808,0.3330737317,0.0391173177,4.6026104212,1.7390797451,-2.184667518 +050,2,3,55,041,Wisconsin,Forest County,9304,9304,9294,9249,9162,9097,9112,9015,9040,8981,9001,9034,8960,-10,-45,-87,-65,15,-97,25,-59,20,33,-74,30,95,116,114,123,110,116,107,82,104,97,35,111,122,119,108,116,124,122,120,112,122,-5,-16,-6,-5,15,-6,-8,-15,-38,-8,-25,0,2,2,2,3,3,3,2,-1,-1,1,-4,-30,-84,-62,0,-95,30,-45,59,44,-50,-4,-28,-82,-60,3,-92,33,-43,58,43,-49,-1,-1,1,0,-3,1,0,-1,0,-2,0,379,379,371,373,363,352,360,358,355,352,315,312,10.246454188,12.601162349,12.486992716,13.509802845,12.136591824,12.849626142,11.875034682,9.1202313425,11.533130025,10.781371568,11.972172788,13.252946608,13.034667835,11.862265912,12.798587742,13.735807256,13.53975917,13.346680013,12.420293873,13.560075581,-1.7257186,-0.651784259,-0.547675119,1.6475369323,-0.661995918,-0.886181113,-1.664724488,-4.226448671,-0.887163848,-2.778704012,0.215714825,0.2172614198,0.2190700476,0.3295073865,0.3309979588,0.3323179175,0.2219632651,-0.111222333,-0.110895481,0.1111481605,-3.235722375,-9.124979632,-6.791171477,0,-10.48160203,3.3231791747,-4.994173464,6.5621176732,4.8794011644,-5.557408025,-3.02000755,-8.907718212,-6.572101429,0.3295073865,-10.15060407,3.6554970922,-4.772210199,6.4508953398,4.7685056834,-5.446259864 +050,2,3,55,043,Wisconsin,Grant County,51208,51204,51234,51186,50880,51011,51708,52103,52044,51773,51501,51509,51021,30,-48,-306,131,697,395,-59,-271,-272,8,-488,144,531,546,525,535,577,597,542,613,533,557,107,491,475,472,488,551,481,502,515,469,526,37,40,71,53,47,26,116,40,98,64,31,4,9,23,50,31,44,31,33,15,24,16,-4,-96,-408,37,593,325,-204,-345,-387,-81,-534,0,-87,-385,87,624,369,-173,-312,-372,-57,-518,-7,-1,8,-9,26,0,-2,1,2,1,-1,3897,3898,3860,3792,3873,4798,5066,4878,4638,4438,4547,4041,10.369068541,10.698959497,10.305129992,10.416768076,11.116355685,11.46456451,10.441449859,11.871332572,10.348509853,10.86511265,9.5879710994,9.3077028589,9.2648025832,9.5016501329,10.615445377,9.236943935,9.6708631534,9.9734686368,9.1059120474,10.260411587,0.7810974419,1.3912566379,1.0403274087,0.9151179431,0.5009103082,2.2276205748,0.7705867055,1.8978639348,1.242597806,0.6047010631,0.1757469244,0.45068877,0.9814409516,0.6035884306,0.8476943676,0.595312395,0.635734032,0.2904893778,0.4659741773,0.3121037745,-1.874633861,-7.994826877,0.7262663042,11.546062559,6.261378852,-3.917539631,-6.646310335,-7.494625947,-1.572662848,-10.41646347,-1.698886936,-7.544138107,1.7077072558,12.14965099,7.1090732196,-3.322227237,-6.010576303,-7.204136569,-1.106688671,-10.1043597 +050,2,3,55,045,Wisconsin,Green County,36842,36839,36858,36853,36760,36933,36856,36928,36782,36843,36867,36853,36603,19,-5,-93,173,-77,72,-146,61,24,-14,-250,110,393,374,422,349,400,378,367,361,346,343,93,342,341,319,352,337,369,321,369,350,374,17,51,33,103,-3,63,9,46,-8,-4,-31,10,36,50,40,40,33,14,11,13,9,3,-4,-92,-176,35,-112,-19,-169,6,22,-18,-221,6,-56,-126,75,-72,14,-155,17,35,-9,-218,-4,0,0,-5,-2,-5,0,-2,-3,-1,-1,405,405,404,382,362,380,357,343,378,387,342,350,10.663265998,10.161248692,11.452919545,9.4594045183,10.84245907,10.256410256,9.9694397284,9.7951431285,9.3868692349,9.3389239817,9.2794833878,9.2646679255,8.6575387079,9.5407174511,9.1347717662,10.012210012,8.7198641766,10.012210012,9.4953879544,10.182966674,1.3837826105,0.896580767,2.7953808367,-0.081312933,1.7076873035,0.2442002442,1.2495755518,-0.217066884,-0.108518719,-0.844042692,0.976787725,1.3584557076,1.085584791,1.0841724376,0.8945028733,0.3798670465,0.298811545,0.3527336861,0.2441671188,0.0816815509,-2.496235297,-4.781764091,0.9498866921,-3.035682825,-0.515016806,-4.585537919,0.1629881154,0.5969339303,-0.488334238,-6.01720758,-1.519447572,-3.423308383,2.035471483,-1.951510388,0.3794860674,-4.205670872,0.4617996604,0.9496676163,-0.244167119,-5.935526029 +050,2,3,55,047,Wisconsin,Green Lake County,19051,19046,19016,19055,19000,18885,18757,18703,18616,18731,18869,18910,18908,-30,39,-55,-115,-128,-54,-87,115,138,41,-2,51,212,191,221,192,191,214,198,199,196,193,72,194,226,240,217,250,226,255,237,223,237,-21,18,-35,-19,-25,-59,-12,-57,-38,-27,-44,1,1,-3,1,5,-2,2,3,3,2,2,-9,22,-14,-98,-109,11,-77,171,174,68,39,-8,23,-17,-97,-104,9,-75,174,177,70,41,-1,-2,-3,1,1,-4,0,-2,-1,-2,1,212,212,213,222,201,165,193,155,163,181,187,177,11.137085971,10.038102746,11.666886631,10.201370809,10.197544047,11.468688872,10.603261306,10.585106383,10.37613489,10.20677984,10.191484332,11.877545658,12.669922133,11.5296743,13.347570742,12.11179292,13.655715318,12.606382979,11.80550041,12.533714104,0.945601639,-1.839442912,-1.003035502,-1.328303491,-3.150026695,-0.643104049,-3.052454012,-2.021276596,-1.429365521,-2.326934264,0.0525334244,-0.157666535,0.0527913422,0.2656606982,-0.106780566,0.1071840081,0.1606554743,0.1595744681,0.1058789274,0.1057697393,1.1557353366,-0.735777165,-5.173551538,-5.79140322,0.5872931127,-4.126584314,9.1573620371,9.2553191489,3.5998835332,2.0625099159,1.208268761,-0.8934437,-5.120760195,-5.525742522,0.4805125467,-4.019400305,9.3180175114,9.414893617,3.7057624606,2.1682796552 +050,2,3,55,049,Wisconsin,Iowa County,23687,23691,23694,23586,23585,23565,23594,23597,23471,23692,23709,23648,23640,3,-108,-1,-20,29,3,-126,221,17,-61,-8,72,291,282,257,259,228,299,263,256,249,243,59,221,206,194,207,193,242,210,192,183,205,13,70,76,63,52,35,57,53,64,66,38,1,3,5,7,12,6,6,3,5,2,2,-8,-182,-78,-90,-29,-38,-188,166,-51,-130,-49,-7,-179,-73,-83,-17,-32,-182,169,-46,-128,-47,-3,1,-4,0,-6,0,-1,-1,-1,1,1,214,214,220,200,207,220,201,186,189,180,181,176,12.30964467,11.956498696,10.901378579,10.98411756,9.6628594435,12.705022521,11.152810466,10.801459885,10.515868826,10.277448824,9.3485617597,8.7341798987,8.2290562036,8.7788121037,8.179525757,10.282994816,8.9052859233,8.1010949136,7.7285301011,8.6702757571,2.9610829103,3.2223187976,2.6723223754,2.205305456,1.4833336865,2.4220277046,2.2475245425,2.7003649712,2.787338725,1.6071730672,0.1269035533,0.2119946577,0.2969247084,0.5089166437,0.2542857748,0.2549502847,0.1272183703,0.2109660134,0.0844648098,0.0845880562,-7.698815567,-3.307116661,-3.817603393,-1.229881889,-1.610476574,-7.988442254,7.0394164917,-2.151853336,-5.49021264,-2.072407376,-7.571912014,-3.095122003,-3.520678685,-0.720965245,-1.356190799,-7.733491969,7.1666348621,-1.940887323,-5.40574783,-1.98781932 +050,2,3,55,051,Wisconsin,Iron County,5916,5916,5925,5959,5888,5829,5860,5724,5656,5675,5671,5688,5698,9,34,-71,-59,31,-136,-68,19,-4,17,10,11,40,34,38,39,36,29,35,30,44,37,10,79,90,93,95,73,87,86,88,77,95,1,-39,-56,-55,-56,-37,-58,-51,-58,-33,-58,0,0,0,0,0,1,1,1,0,0,0,8,74,-14,-3,87,-102,-10,69,53,51,67,8,74,-14,-3,87,-101,-9,70,53,51,67,0,-1,-1,-1,0,2,-1,0,1,-1,1,96,96,94,94,88,86,93,82,92,90,92,90,6.7317401548,5.739849751,6.4863019544,6.6729403713,6.2154696133,5.0966608084,6.1777424764,5.2882072977,7.7471608416,6.4992095556,13.295186806,15.193719929,15.874370573,16.25459834,12.60359116,15.289982425,15.179595799,15.51207474,13.557531473,16.68715967,-6.563446651,-9.453870178,-9.388068618,-9.581657969,-6.388121547,-10.19332162,-9.001853323,-10.22386744,-5.810370631,-10.18795011,0,0,0,0,0.1726519337,0.1757469244,0.1765069279,0,0,0,12.453719286,-2.363467545,-0.51207647,14.885790059,-17.61049724,-1.757469244,12.178978025,9.3424995593,8.9796637028,11.768838925,12.453719286,-2.363467545,-0.51207647,14.885790059,-17.4378453,-1.58172232,12.355484953,9.3424995593,8.9796637028,11.768838925 +050,2,3,55,053,Wisconsin,Jackson County,20449,20441,20464,20522,20500,20561,20584,20526,20484,20496,20494,20676,20630,23,58,-22,61,23,-58,-42,12,-2,182,-46,56,238,248,240,246,275,242,236,210,248,235,29,197,197,212,217,232,187,220,215,197,193,27,41,51,28,29,43,55,16,-5,51,42,1,2,3,-2,4,4,10,12,27,7,2,-1,16,-76,38,-6,-104,-106,-16,-23,126,-90,0,18,-73,36,-2,-100,-96,-4,4,133,-88,-4,-1,0,-3,-4,-1,-1,0,-1,-2,0,1333,1333,1304,1292,1305,1294,1316,1313,1312,1317,1290,1299,11.613721759,12.091073083,11.689924746,11.957710536,13.378739966,11.801999512,11.517813568,10.246401561,12.047607481,11.378492229,9.6130385985,9.6046024085,10.326100192,10.548061733,11.286791535,9.1197268959,10.736944851,10.490363503,9.5700752975,9.3448893623,2.0006831601,2.4864706743,1.3638245537,1.409648803,2.091948431,2.6822726164,0.7808687164,-0.243961942,2.4775321836,2.0336028664,0.0975943005,0.1462629808,-0.09741604,0.1944343177,0.1945998541,0.4876859303,0.5856515373,1.3173944865,0.340053437,0.0968382317,0.7807544039,-3.705328848,1.8509047515,-0.291651476,-5.059596205,-5.169470861,-0.780868716,-1.122224933,6.1209618654,-4.357720428,0.8783487044,-3.559065867,1.7534887119,-0.097217159,-4.864996351,-4.681784931,-0.195217179,0.1951695535,6.4610153024,-4.260882196 +050,2,3,55,055,Wisconsin,Jefferson County,83686,83692,83727,83854,84367,84613,84370,84501,84494,84733,85091,84829,85038,35,127,513,246,-243,131,-7,239,358,-262,209,229,940,890,878,920,847,857,842,851,778,774,130,627,597,632,674,651,697,702,743,697,749,99,313,293,246,246,196,160,140,108,81,25,18,18,48,48,51,44,36,21,20,5,10,-76,-202,185,-32,-543,-101,-201,83,234,-350,170,-58,-184,233,16,-492,-57,-165,104,254,-345,180,-6,-2,-13,-16,3,-8,-2,-5,-4,2,4,3678,3678,3560,3600,3659,3396,3436,3168,3165,2987,2911,3159,11.218455553,10.581318623,10.391762339,10.888669274,10.031325686,10.142311903,9.9511307297,10.022140569,9.1572504708,9.1130119446,7.4829485443,7.0978058625,7.4801751687,7.9771337945,7.7100271805,8.2487647564,8.2965484231,8.750235538,8.2038606403,8.8186640136,3.7355070086,3.48351276,2.9115871701,2.9115354799,2.321298506,1.8935471464,1.6545823066,1.2719050311,0.9533898305,0.294347931,0.2148214893,0.5706778583,0.5681145698,0.6036110141,0.5211078279,0.4260481079,0.248187346,0.2355379687,0.0588512241,0.1177391724,-2.410774491,2.1994875788,-0.378743047,-6.426681974,-1.196179332,-2.378768603,0.9809309389,2.755794234,-4.119585687,2.001565931,-2.195953002,2.7701654371,0.1893715233,-5.82307096,-0.675071504,-1.952720495,1.2291182849,2.9913322028,-4.060734463,2.1193051034 +050,2,3,55,057,Wisconsin,Juneau County,26664,26665,26675,26705,26775,26571,26349,26319,26345,26474,26599,26688,26908,10,30,70,-204,-222,-30,26,129,125,89,220,62,266,273,297,248,293,266,291,261,270,254,49,268,276,312,293,269,307,310,293,284,294,13,-2,-3,-15,-45,24,-41,-19,-32,-14,-40,1,7,7,5,5,7,7,4,4,1,2,-1,26,70,-195,-181,-58,61,145,155,100,261,0,33,77,-190,-176,-51,68,149,159,101,263,-3,-1,-4,1,-1,-3,-1,-1,-2,2,-3,1651,1651,1635,1717,1699,1645,1672,1679,1630,1621,1637,1629,9.9662795054,10.209424084,11.134855472,9.3726379441,11.1263006,10.101777305,11.018762188,9.8355095811,10.133803742,9.4783192776,10.041213938,10.321615557,11.69722191,11.073318216,10.214931268,11.658818168,11.738200269,11.041395813,10.659260232,10.970967983,-0.074934432,-0.112191473,-0.562366438,-1.700680272,0.9113693324,-1.557040863,-0.719438081,-1.205886232,-0.52545649,-1.492648705,0.2622705133,0.2617801047,0.1874554793,0.1889644747,0.2658160553,0.2658362449,0.1514606486,0.150735779,0.0375326065,0.0746324353,0.9741476208,2.6178010471,-7.310763694,-6.840513983,-2.202475887,2.316572991,5.4904485128,5.8410114371,3.7532606452,9.739532801,1.2364181341,2.8795811518,-7.123308214,-6.651549509,-1.936659831,2.5824092359,5.6419091615,5.9917472161,3.7907932516,9.8141652362 +050,2,3,55,059,Wisconsin,Kenosha County,166426,166424,166629,166871,167273,167380,167938,168044,168012,168492,169054,169760,169671,205,242,402,107,558,106,-32,480,562,706,-89,525,2028,1948,1976,1989,1903,1922,1876,1878,1833,1802,262,1332,1393,1395,1409,1432,1376,1471,1507,1417,1497,263,696,555,581,580,471,546,405,371,416,305,26,62,75,81,113,148,81,74,62,-29,8,-76,-516,-200,-549,-106,-505,-657,8,135,314,-411,-50,-454,-125,-468,7,-357,-576,82,197,285,-403,-8,0,-28,-6,-29,-8,-2,-7,-6,5,9,4601,4601,4499,4488,4394,4513,4384,4357,4353,4368,4372,4219,12.16191904,11.659643746,11.80924719,11.863365522,11.327987809,11.438569762,11.149941754,11.127372269,10.820095982,10.617769149,7.988005997,8.3377226585,8.3369938414,8.4039628055,8.5242661809,8.1891113386,8.7428381238,8.9291533598,8.3644713619,8.82064396,4.1739130435,3.3219210879,3.472253349,3.4594027162,2.8037216279,3.2494584236,2.4071036303,2.1982189094,2.45562462,1.7971251889,0.371814093,0.4489082551,0.4840835134,0.6739870809,0.8809995774,0.4820625134,0.4398164658,0.367357338,-0.17118537,0.0471377099,-3.094452774,-1.19708868,-3.28101048,-0.632235669,-3.006113423,-3.910062609,0.047547726,0.7998909778,1.8535243526,-2.421699845,-2.722638681,-0.748180425,-2.796926966,0.0417514121,-2.125113845,-3.428000095,0.4873641918,1.1672483158,1.6823389825,-2.374562135 +050,2,3,55,061,Wisconsin,Kewaunee County,20574,20578,20561,20556,20504,20374,20347,20329,20378,20406,20367,20451,20386,-17,-5,-52,-130,-27,-18,49,28,-39,84,-65,42,205,206,194,209,182,196,201,174,213,190,55,166,160,197,191,187,163,204,204,181,199,-13,39,46,-3,18,-5,33,-3,-30,32,-9,0,1,4,7,11,14,20,15,16,10,8,-1,-45,-105,-136,-54,-26,-3,18,-24,41,-63,-1,-44,-101,-129,-43,-12,17,33,-8,51,-55,-3,0,3,2,-2,-1,-1,-2,-1,1,-1,178,178,172,179,175,177,173,177,165,157,161,158,9.9715446166,10.034096444,9.4916581046,10.264973846,8.948765857,9.6297934016,9.8568065908,8.5350599662,10.436572101,9.3052868722,8.0745190554,7.7934729664,9.6384363227,9.3809091132,9.1946110729,8.008450635,10.003923107,10.006622029,8.8686363859,9.7460636188,1.8970255612,2.2406234778,-0.146778218,0.8840647332,-0.245845216,1.6213427666,-0.147116516,-1.471562063,1.5679357146,-0.440776747,0.0486416811,0.1948368242,0.3424825089,0.5402617814,0.6883666044,0.9826319798,0.7355825814,0.7848331003,0.4899799108,0.3918015525,-2.188875648,-5.114466634,-6.653945888,-2.6521942,-1.278395122,-0.147394797,0.8826990977,-1.177249651,2.0089176344,-3.085437226,-2.140233966,-4.91962981,-6.311463379,-2.111932418,-0.590028518,0.8352371828,1.6182816791,-0.39241655,2.4988975452,-2.693635674 +050,2,3,55,063,Wisconsin,La Crosse County,114638,114640,114879,115255,116581,116938,117508,117782,117804,118161,118220,118151,118502,239,376,1326,357,570,274,22,357,59,-69,351,362,1299,1258,1218,1267,1268,1240,1204,1155,1144,1147,238,988,947,1011,943,990,1000,1019,1032,1026,1080,124,311,311,207,324,278,240,185,123,118,67,29,66,59,96,61,63,50,46,9,31,25,94,3,933,70,204,-51,-265,133,-71,-220,251,123,69,992,166,265,12,-215,179,-62,-189,276,-8,-4,23,-16,-19,-16,-3,-7,-2,2,8,5195,5195,5087,5643,5665,5821,5787,5747,5633,5570,5364,5387,11.289075061,10.85249918,10.431699348,10.808459091,10.778188618,10.526941329,10.20490327,9.7723590305,9.6796984402,9.693517513,8.5863018937,8.169568143,8.6588243355,8.0444963872,8.4151472651,8.4894688139,8.6368741127,8.7316662507,8.6812680067,9.1272876321,2.7027731669,2.6829310375,1.7728750123,2.7639627036,2.3630413532,2.0374725153,1.5680291569,1.0406927799,0.9984304335,0.5662298809,0.5735788714,0.5089804862,0.8222029043,0.5203756942,0.5355093714,0.4244734407,0.3898883309,0.0761482522,0.2622995207,0.2112798063,0.0260717669,8.0487931124,0.599522951,1.7402728134,-0.433507586,-2.249709236,1.1272858263,-0.600725101,-1.861480469,2.1212492552,0.5996506383,8.5577735986,1.4217258553,2.2606485075,0.102001785,-1.825235795,1.5171741572,-0.524576848,-1.599180949,2.3325290615 +050,2,3,55,065,Wisconsin,Lafayette County,16836,16825,16799,16853,16792,16662,16769,16785,16751,16688,16659,16667,16646,-26,54,-61,-130,107,16,-34,-63,-29,8,-21,40,208,204,211,220,232,215,205,208,221,221,22,132,129,140,135,125,152,127,154,139,156,18,76,75,71,85,107,63,78,54,82,65,1,0,-3,2,2,1,6,2,10,-1,0,-46,-20,-137,-207,23,-93,-102,-142,-92,-74,-86,-45,-20,-140,-205,25,-92,-96,-140,-82,-75,-86,1,-2,4,4,-3,1,-1,-1,-1,1,0,120,120,119,116,100,94,99,97,102,99,106,98,12.361820991,12.126616139,12.614336103,13.16143699,13.828455624,12.822041985,12.261132211,12.474885297,13.262917842,13.268093537,7.845001783,7.6683013821,8.3697016799,8.0763363345,7.4506765214,9.0648854962,7.5959209306,9.2362131526,8.3418352037,9.365713085,4.5168192084,4.458314757,4.2446344234,5.0851006551,6.3777791023,3.7571564885,4.6652112802,3.2386721444,4.9210826382,3.9023804521,0,-0.17833259,0.1195671669,0.1196494272,0.0596054122,0.3578244275,0.1196208021,0.5997541008,-0.060013203,0,-1.188636634,-8.143854956,-12.37520177,1.3759684126,-5.543303332,-6.083015267,-8.493076946,-5.517737728,-4.440977015,-5.163149521,-1.188636634,-8.322187546,-12.2556346,1.4956178397,-5.48369792,-5.72519084,-8.373456144,-4.917983627,-4.500990218,-5.163149521 +050,2,3,55,067,Wisconsin,Langlade County,19977,19977,19964,19794,19621,19415,19258,19051,19087,19184,19239,19208,19119,-13,-170,-173,-206,-157,-207,36,97,55,-31,-89,58,193,209,178,202,173,191,218,169,219,200,63,216,225,249,237,265,225,227,200,235,270,-5,-23,-16,-71,-35,-92,-34,-9,-31,-16,-70,4,7,7,12,18,20,18,17,16,9,12,-9,-155,-165,-150,-140,-133,53,90,71,-24,-31,-5,-148,-158,-138,-122,-113,71,107,87,-15,-19,-3,1,1,3,0,-2,-1,-1,-1,0,0,281,281,279,260,248,257,238,258,252,279,281,276,9.7087378641,10.605099581,9.1197868634,10.446564787,9.0318201989,10.016256752,11.392438139,8.796814408,11.392306292,10.436506901,10.865737713,11.416973234,12.757454657,12.256613141,13.834869091,11.799255336,11.862768153,10.410431252,12.224620907,14.089284317,-1.156999849,-0.811873652,-3.637667794,-1.810048354,-4.803048892,-1.782998584,-0.470330015,-1.613616844,-0.832314615,-3.652777415,0.3521303889,0.3551947228,0.6148170919,0.9308820107,1.0441410635,0.9439404269,0.8884011392,0.8328345002,0.4681769709,0.6261904141,-7.797172896,-8.372447038,-7.685213649,-7.240193417,-6.943538072,2.7793801458,4.7033001489,3.6957030945,-1.248471922,-1.61765857,-7.445042507,-8.017252315,-7.070396557,-6.309311406,-5.899397009,3.7233205727,5.5917012882,4.5285375947,-0.780294951,-0.991468156 +050,2,3,55,069,Wisconsin,Lincoln County,28743,28743,28777,28503,28501,28301,28105,27864,27844,27745,27686,27596,27566,34,-274,-2,-200,-196,-241,-20,-99,-59,-90,-30,81,263,273,269,270,246,292,249,282,256,252,50,326,326,359,338,335,342,337,346,314,323,31,-63,-53,-90,-68,-89,-50,-88,-64,-58,-71,-1,1,1,2,3,6,4,1,0,0,0,9,-213,56,-114,-129,-158,28,-9,6,-33,41,8,-212,57,-112,-126,-152,32,-8,6,-33,41,-5,1,-6,2,-2,0,-2,-3,-1,1,0,560,560,554,708,663,637,622,635,607,595,588,588,9.1829608939,9.5782752088,9.4714974825,9.573449633,8.7905804999,10.483234006,8.9586069186,10.174811928,9.2616041388,9.1367245568,11.382681564,11.437793839,12.640399986,11.984540652,11.970912469,12.278308322,12.12470093,12.483989104,11.359936326,11.710960444,-2.19972067,-1.85951863,-3.168902503,-2.411091019,-3.180331969,-1.795074316,-3.166094011,-2.309177175,-2.098332188,-2.574235887,0.0349162011,0.0350852572,0.0704200556,0.1063716626,0.2144044024,0.1436059453,0.035978341,0,0,0,-7.437150838,1.9647744018,-4.013943171,-4.573981491,-5.645982598,1.005241617,-0.323805069,0.2164853602,-1.193878659,1.4865305826,-7.402234637,1.999859659,-3.943523115,-4.467609829,-5.431578195,1.1488475623,-0.287826728,0.2164853602,-1.193878659,1.4865305826 +050,2,3,55,071,Wisconsin,Manitowoc County,81442,81444,81330,81035,80720,80487,79950,79488,79363,79056,78925,78785,78757,-114,-295,-315,-233,-537,-462,-125,-307,-131,-140,-28,199,839,854,820,817,786,815,777,791,745,754,188,822,773,871,859,917,877,895,912,843,889,11,17,81,-51,-42,-131,-62,-118,-121,-98,-135,8,39,60,62,58,71,51,31,44,21,19,-135,-350,-460,-240,-558,-398,-109,-218,-53,-60,89,-127,-311,-400,-178,-500,-327,-58,-187,-9,-39,108,2,-1,4,-4,5,-4,-5,-2,-1,-3,-1,1100,1100,1067,1059,1080,1046,1039,1036,985,999,984,983,10.33473963,10.559179005,10.173255504,10.184683084,9.8596319572,10.261188157,9.8094294245,10.013862426,9.4477204997,9.5720506278,10.125334894,9.557664369,10.80598237,10.708253084,11.50290395,11.041793882,11.299149723,11.545692203,10.690507894,11.285879321,0.2094047362,1.0015146363,-0.632726867,-0.523569999,-1.643271993,-0.780605725,-1.489720299,-1.531829777,-1.242787395,-1.713828693,0.4803991008,0.7418626936,0.7691973674,0.7230252373,0.890628332,0.6421111608,0.3913671971,0.5570290098,0.2663115846,0.2412055198,-4.311273981,-5.687613984,-2.977538196,-6.956001421,-4.992536284,-1.372355226,-2.752195128,-0.670966762,-0.760890242,1.1298574348,-3.830874881,-4.945751291,-2.208340829,-6.232976184,-4.101907952,-0.730244065,-2.360827931,-0.113937752,-0.494578657,1.3710629546 +050,2,3,55,073,Wisconsin,Marathon County,134063,134073,134064,134355,134391,134912,135173,135361,135132,135525,135478,135697,135593,-9,291,36,521,261,188,-229,393,-47,219,-104,407,1656,1624,1602,1594,1622,1601,1568,1530,1518,1532,298,1150,1142,1157,1123,1098,1225,1238,1231,1238,1228,109,506,482,445,471,524,376,330,299,280,304,26,36,64,78,54,94,90,83,74,58,45,-141,-248,-510,20,-245,-422,-693,-11,-419,-120,-458,-115,-212,-446,98,-191,-328,-603,72,-345,-62,-413,-3,-3,0,-22,-19,-8,-2,-9,-1,1,5,1655,1655,1670,1640,1627,1623,1623,1588,1591,1559,1549,1429,12.338917886,12.085761276,11.897379532,11.80369143,11.991099086,11.837644597,11.586620704,11.291387918,11.19572232,11.294187032,8.5686929763,8.4987311439,8.5925518839,8.3159005498,8.117279159,9.0575356848,9.1481099694,9.0847702793,9.1306351987,9.0530428693,3.7702249096,3.5870301325,3.3048276477,3.4877908806,3.8738199265,2.7801089122,2.438510735,2.2066176389,2.0650871209,2.2411441631,0.2682373453,0.4762861587,0.5792731607,0.3998741137,0.6949218952,0.6654516013,0.613322397,0.5461194157,0.4277680465,0.3317483136,-1.847857268,-3.795405327,0.1485315797,-1.814243664,-3.119755742,-5.12397733,-0.081283691,-3.092216691,-0.885037338,-3.376460614,-1.579619923,-3.319119168,0.7278047404,-1.41436955,-2.424833847,-4.458525729,0.5320387058,-2.546097276,-0.457269291,-3.0447123 +050,2,3,55,075,Wisconsin,Marinette County,41749,41749,41662,41419,41360,41306,41072,40676,40298,40341,40401,40256,40262,-87,-243,-59,-54,-234,-396,-378,43,60,-145,6,82,394,365,404,380,358,384,394,371,352,353,129,506,500,533,467,505,508,478,551,573,560,-47,-112,-135,-129,-87,-147,-124,-84,-180,-221,-207,1,9,6,11,7,9,13,10,12,4,5,-38,-139,79,71,-150,-258,-266,122,230,72,211,-37,-130,85,82,-143,-249,-253,132,242,76,216,-3,-1,-9,-7,-4,0,-1,-5,-2,0,-3,1073,1073,1088,1000,974,840,719,614,614,608,608,589,9.4847197313,8.8186617379,9.7742723732,9.2257641603,8.7586240642,9.4845258972,9.7719465767,9.1897649303,8.7283186828,8.7682257383,12.180883716,12.080358545,12.895265284,11.337978587,12.355042325,12.547237385,11.855305745,13.648410988,14.208314219,13.909933183,-2.696163985,-3.261696807,-3.120992911,-2.112214426,-3.596418261,-3.062711488,-2.083359169,-4.458646058,-5.479995537,-5.141707444,0.2166560345,0.1449643025,0.2661311785,0.1699482872,0.2201888731,0.3210907205,0.2480189486,0.2972430705,0.0991854396,0.124195832,-3.346132088,1.9086966501,1.7177557884,-3.641749011,-6.31208103,-6.570010127,3.0258311735,5.6971588517,1.7853379124,5.2410641099,-3.129476053,2.0536609527,1.9838869668,-3.471800723,-6.091892156,-6.248919406,3.2738501221,5.9944019222,1.884523352,5.3652599419 +050,2,3,55,077,Wisconsin,Marquette County,15404,15397,15372,15363,15237,15174,15060,15112,15115,15270,15393,15537,15585,-25,-9,-126,-63,-114,52,3,155,123,144,48,37,171,140,149,160,158,134,121,149,147,150,54,196,150,160,187,195,203,166,213,187,182,-17,-25,-10,-11,-27,-37,-69,-45,-64,-40,-32,0,2,2,1,2,3,3,2,1,2,0,-7,15,-118,-52,-86,86,69,199,186,182,81,-7,17,-116,-51,-84,89,72,201,187,184,81,-1,-1,0,-1,-3,0,0,-1,0,0,-1,153,153,149,150,148,152,147,134,147,149,140,137,11.127379209,9.1503267974,9.7990858571,10.584110604,10.473286491,8.8662454097,7.9644561461,9.7185533053,9.5053346266,9.6394833237,12.754189035,9.8039215686,10.522508303,12.370179268,12.925891555,13.431700136,10.926443969,13.892965463,12.091820239,11.695906433,-1.626809826,-0.653594771,-0.723422446,-1.786068664,-2.452605064,-4.565454726,-2.961987823,-4.174412158,-2.586485613,-2.056423109,0.1301447861,0.1307189542,0.0657656769,0.1323013825,0.1988598701,0.1984980316,0.1316439032,0.06522519,0.1293242806,0,0.9760858956,-7.712418301,-3.419815198,-5.68895945,5.7006496089,4.5654547259,13.098568373,12.131885334,11.768509538,5.2053209948,1.1062306816,-7.581699346,-3.354049522,-5.556658067,5.899509479,4.7639527575,13.230212276,12.197110524,11.897833818,5.2053209948 +050,2,3,55,078,Wisconsin,Menominee County,4232,4232,4270,4372,4364,4384,4508,4510,4531,4602,4596,4553,4546,38,102,-8,20,124,2,21,71,-6,-43,-7,31,100,103,88,91,96,102,90,79,90,85,12,39,35,34,44,34,52,50,46,53,73,19,61,68,54,47,62,50,40,33,37,12,5,18,11,25,15,0,0,0,0,0,0,13,24,-90,-62,60,-59,-29,31,-39,-80,-18,18,42,-79,-37,75,-59,-29,31,-39,-80,-18,1,-1,3,3,2,-1,0,0,0,0,-1,59,59,59,58,51,59,42,57,57,57,57,57,23.142791021,23.580586081,20.118884316,20.467836257,21.29075183,22.563875677,19.708748494,17.177647315,19.674281342,18.683371799,9.025688498,8.0128205128,7.7732053041,9.8965362123,7.5404746063,11.503152306,10.949304719,10.002174386,11.585965679,16.04571931,14.117102523,15.567765568,12.345679012,10.571300045,13.750277223,11.060723371,8.7594437753,7.1754729289,8.0883156629,2.6376524893,4.1657023837,2.5183150183,5.7155921353,3.3738191633,0,0,0,0,0,0,5.5542698449,-20.6043956,-14.1746685,13.495276653,-13.08494123,-6.415219555,6.7885689259,-8.480104371,-17.48825008,-3.956478734,9.7199722287,-18.08608059,-8.45907636,16.869095816,-13.08494123,-6.415219555,6.7885689259,-8.480104371,-17.48825008,-3.956478734 +050,2,3,55,079,Wisconsin,Milwaukee County,947735,947712,948289,951376,954672,957557,958639,958606,955121,950843,947908,947011,945016,577,3087,3296,2885,1082,-33,-3485,-4278,-2935,-897,-1995,3598,14177,14248,14002,13966,13980,13711,13506,13308,13060,12911,2013,8259,7999,8256,8152,8113,8237,8294,8561,8513,8761,1585,5918,6249,5746,5814,5867,5474,5212,4747,4547,4150,369,1472,2016,2635,2563,2928,2804,2932,2461,1258,1397,-1353,-4293,-4891,-5426,-7272,-8830,-11779,-12445,-10152,-6699,-7555,-984,-2821,-2875,-2791,-4709,-5902,-8975,-9513,-7691,-5441,-6158,-24,-10,-78,-70,-23,2,16,23,9,-3,13,24490,24494,24356,24247,23976,23832,23914,23617,22787,22801,22644,22370,14.925789547,14.950305554,14.644689522,14.576796946,14.583425697,14.329107548,14.172355826,14.017635804,13.784230355,13.647796781,8.6952173146,8.3932828554,8.6349490568,8.5085241802,8.4631854562,8.6083333725,8.7032074058,9.0175067716,8.9850806288,9.2609672061,6.2305722325,6.5570226983,6.0097404652,6.0682727654,6.1202402406,5.7207741752,5.4691484204,5.0001290322,4.7991497262,4.3868295748,1.5497469291,2.115371701,2.7559460713,2.6750916921,3.054382721,2.9304075242,3.0766583209,2.5922303662,1.3277612394,1.4767231123,-4.519744271,-5.132084816,-5.675052517,-7.590037762,-9.211133684,-12.31001078,-13.05900846,-10.69334526,-7.070486918,-7.986143961,-2.969997342,-3.016713115,-2.919106446,-4.91494607,-6.156750963,-9.379603256,-9.982350139,-8.101114891,-5.742725679,-6.509420849 +050,2,3,55,081,Wisconsin,Monroe County,44673,44675,44813,45059,45008,45123,45162,45314,45505,45818,46197,46674,46582,138,246,-51,115,39,152,191,313,379,477,-92,165,615,662,570,622,607,625,606,544,582,567,62,430,428,431,412,384,430,414,456,426,449,103,185,234,139,210,223,195,192,88,156,118,7,21,45,20,21,53,40,39,36,18,23,33,42,-331,-36,-187,-121,-42,86,257,302,-233,40,63,-286,-16,-166,-68,-2,125,293,320,-210,-5,-2,1,-8,-5,-3,-2,-4,-2,1,0,859,860,860,849,819,816,772,901,919,891,1232,1125,13.686131387,14.700167653,12.648256427,13.77859002,13.417922985,13.763639767,13.271574521,11.824159104,12.533514229,12.160075491,9.5691650347,9.5040358844,9.5638570525,9.126654483,8.488438923,9.4693841597,9.0667192274,9.9114274846,9.17401557,9.6294072231,4.1169663521,5.1961317686,3.0843993742,4.6519355375,4.9294840621,4.2942556073,4.2048552938,1.9127316198,3.3594986594,2.530668268,0.4673313156,0.9992561093,0.4437984711,0.4651935537,1.1715814139,0.8808729451,0.8541112316,0.7824811172,0.3876344607,0.4932658488,0.9346626313,-7.350083826,-0.798837248,-4.142437836,-2.674742473,-0.924916592,1.883424767,5.5860457534,6.5036448407,-4.996997512,1.4019939469,-6.350827717,-0.355038777,-3.677244282,-1.503161059,-0.044043647,2.7375359986,6.3685268706,6.8912793014,-4.503731663 +050,2,3,55,083,Wisconsin,Oconto County,37660,37657,37714,37571,37418,37364,37459,37474,37477,37530,37901,38057,38383,57,-143,-153,-54,95,15,3,53,371,156,326,96,363,348,366,329,397,354,350,378,382,388,53,378,326,347,342,367,353,376,404,355,405,43,-15,22,19,-13,30,1,-26,-26,27,-17,0,4,15,12,15,15,14,6,4,4,3,19,-133,-189,-81,102,-26,-10,75,394,126,341,19,-129,-174,-69,117,-11,4,81,398,130,344,-5,1,-1,-4,-9,-4,-2,-2,-1,-1,-1,281,281,270,271,284,284,282,272,248,238,276,257,9.64335525,9.2813612663,9.7884517665,8.7940873795,10.596132545,9.4461714987,9.3324623035,10.022404582,10.058190052,10.151753009,10.041841004,8.6946085426,9.2803080955,9.1415741149,9.7954172394,9.4194873984,10.025730932,10.711776325,9.3472708602,10.596546311,-0.398485754,0.5867527237,0.5081436709,-0.347486735,0.8007153057,0.0266841003,-0.693268628,-0.689371744,0.7109191922,-0.444793302,0.1062628678,0.4000586753,0.3209328448,0.4009462331,0.4003576528,0.3735774039,0.1599850681,0.1060571913,0.1053213618,0.0784929356,-3.533240353,-5.040739308,-2.166296702,2.7264343851,-0.693953265,-0.266841003,1.9998133508,10.446633347,3.3176228969,8.9220303506,-3.426977486,-4.640680633,-1.845363858,3.1273806183,-0.293595612,0.1067364011,2.1597984188,10.552690538,3.4229442587,9.0005232862 +050,2,3,55,085,Wisconsin,Oneida County,35998,36011,35949,35795,35679,35562,35330,35307,35358,35237,35449,35607,35751,-62,-154,-116,-117,-232,-23,51,-121,212,158,144,87,305,325,285,281,293,322,288,333,299,309,123,437,424,443,443,479,478,450,469,454,479,-36,-132,-99,-158,-162,-186,-156,-162,-136,-155,-170,4,10,15,13,12,3,3,2,0,1,1,-25,-30,-24,36,-74,164,206,40,349,312,316,-21,-20,-9,49,-62,167,209,42,349,313,317,-5,-2,-8,-8,-8,-4,-2,-1,-1,0,-3,610,610,579,556,519,499,541,513,545,592,593,599,8.5024531668,9.0942160786,8.001010654,7.9275517689,8.2959355579,9.1134224864,8.1592180749,9.4219505984,8.4158973204,8.66055663,12.18220339,11.864454207,12.436658666,12.497884105,13.56229738,13.528620958,12.748778242,13.269954446,12.778653456,13.425264161,-3.679750223,-2.770238129,-4.435648012,-4.570332337,-5.266361822,-4.415198472,-4.589560167,-3.848003848,-4.362756136,-4.764707531,0.2787689563,0.4197330498,0.3649583807,0.338543136,0.0849413197,0.0849076629,0.0566612366,0,0.0281468138,0.0280276914,-0.836306869,-0.67157288,1.0106539773,-2.087682672,4.6434588105,5.8303261869,1.1332247326,9.8746569335,8.7818058996,8.8567504695,-0.557537913,-0.25183983,1.3756123581,-1.749139536,4.7284001302,5.9152338499,1.1898859693,9.8746569335,8.8099527134,8.8847781608 +050,2,3,55,087,Wisconsin,Outagamie County,176695,176614,176843,177877,178960,180301,182127,183311,184606,185834,187012,187927,188766,229,1034,1083,1341,1826,1184,1295,1228,1178,915,839,592,2354,2241,2272,2244,2350,2348,2284,2180,2211,2193,316,1253,1246,1253,1277,1499,1437,1427,1457,1495,1504,276,1101,995,1019,967,851,911,857,723,716,689,42,132,185,242,263,221,193,177,124,132,106,-81,-195,-64,110,631,133,199,205,336,64,32,-39,-63,121,352,894,354,392,382,460,196,138,-8,-4,-33,-30,-35,-21,-8,-11,-5,3,12,3039,3039,3060,2966,2999,3034,3003,3020,2990,2975,2917,2866,13.272440235,12.560356689,12.648186138,12.383149205,12.861278794,12.763748345,12.331281719,11.693836061,11.793918477,11.643433778,7.0647271087,6.9835807385,6.975430119,7.0469169049,8.2038540053,7.8115444516,7.7043515819,7.8155592389,7.9746305399,7.9852824449,6.2077131258,5.5767759509,5.6727560186,5.3362322999,4.6574247889,4.9522038938,4.6269301371,3.8782768221,3.8192879375,3.6581513328,0.7442489851,1.0368879909,1.3472099671,1.4513227455,1.2095074951,1.0491496723,0.9556203434,0.6651539778,0.704114536,0.5627925127,-1.099458728,-0.358707197,0.6123681669,3.4820709217,0.7278936509,1.0817657243,1.1067919231,1.802352714,0.3413888659,0.1698996265,-0.355209743,0.678180794,1.959578134,4.9333936672,1.937401146,2.1309153967,2.0624122665,2.4675066918,1.0455034019,0.7326921392 +050,2,3,55,089,Wisconsin,Ozaukee County,86395,86395,86378,86811,87137,87250,87622,87991,88413,88540,89302,89597,90043,-17,433,326,113,372,369,422,127,762,295,446,206,797,813,801,785,833,834,839,820,851,829,153,716,752,719,681,738,802,767,821,800,879,53,81,61,82,104,95,32,72,-1,51,-50,12,55,72,103,131,131,128,118,48,82,68,-80,300,205,-68,144,152,267,-59,722,166,430,-68,355,277,35,275,283,395,59,770,248,498,-2,-3,-12,-4,-7,-9,-5,-4,-7,-4,-2,1804,1804,1827,1833,1813,1897,2050,2019,1837,1883,1897,1929,9.2038177944,9.3476211282,9.1864645874,8.9779953337,9.4867692027,9.455567901,9.4827440055,9.2216686722,9.5137479807,9.2295702516,8.2684235142,8.6462621013,8.2460275135,7.7885539137,8.4048447438,9.0927643364,8.6689685962,9.2329146096,8.9435938714,9.786239145,0.9353942802,0.7013590268,0.9404370739,1.18944142,1.0819244589,0.3628035645,0.8137754093,-0.011245937,0.5701541093,-0.556668893,0.6351442644,0.8278336054,1.1812807147,1.4982387117,1.4919168854,1.4512142582,1.3336874763,0.5398049954,0.9167183718,0.7570696949,3.4644232601,2.3570262377,-0.779874647,1.6469188892,1.7310791342,3.0271422417,-0.666843738,8.1195668065,1.8557957283,4.7873524827,4.0995675245,3.1848598432,0.4014060681,3.145157601,3.2229960197,4.4783564999,0.6668437382,8.6593718019,2.7725141001,5.5444221777 +050,2,3,55,091,Wisconsin,Pepin County,7469,7469,7472,7401,7373,7346,7299,7238,7245,7246,7276,7265,7271,3,-71,-28,-27,-47,-61,7,1,30,-11,6,25,70,83,82,77,79,73,84,82,85,78,7,82,59,83,83,72,76,61,76,54,87,18,-12,24,-1,-6,7,-3,23,6,31,-9,0,1,5,1,2,1,5,2,4,1,2,-17,-60,-60,-26,-44,-69,6,-23,21,-44,12,-17,-59,-55,-25,-42,-68,11,-21,25,-43,14,2,0,3,-1,1,0,-1,-1,-1,1,1,136,136,130,131,130,134,125,125,112,103,106,61,9.4130303234,11.235955056,11.142061281,10.515534312,10.8688175,10.080784368,11.593402802,11.293210302,11.691080393,10.731975784,11.026692665,7.9870041966,11.277940077,11.334926596,9.9057577217,10.495063178,8.4190187013,10.466877841,7.4272746028,11.970280682,-1.613662341,3.2489508596,-0.135878796,-0.819392284,0.9630597785,-0.41427881,3.1743841005,0.8263324611,4.2638057905,-1.238304898,0.1344718618,0.6768647624,0.1358787961,0.2731307614,0.1375799684,0.6904646827,0.2760334,0.5508883074,0.1375421223,0.2751788663,-8.068311706,-8.122377149,-3.532848699,-6.00887675,-9.493017817,0.8285576193,-3.1743841,2.8921636138,-6.05185338,1.6510731976,-7.933839844,-7.445512387,-3.396969903,-5.735745988,-9.355437848,1.519022302,-2.8983507,3.4430519212,-5.914311258,1.9262520638 +050,2,3,55,093,Wisconsin,Pierce County,41019,41029,41091,40906,40744,40845,41076,41117,41528,42075,42608,42768,42700,62,-185,-162,101,231,41,411,547,533,160,-68,100,399,400,416,359,391,407,370,365,382,361,68,231,241,261,242,291,294,310,296,264,302,32,168,159,155,117,100,113,60,69,118,59,-3,-6,8,54,46,71,52,48,32,18,25,38,-352,-339,-107,77,-128,246,438,430,26,-156,35,-358,-331,-53,123,-57,298,486,462,44,-131,-5,5,10,-1,-9,-2,0,1,2,-2,4,2766,2766,2660,2610,2516,2517,2498,2458,2590,2776,2812,2756,9.7320633682,9.7979179424,10.197453088,8.7645414485,9.5141922061,9.8493556779,8.8513570087,8.6203842566,8.9486506747,8.4476061216,5.6343524763,5.9032455603,6.3979212884,5.9081310043,7.0808949667,7.1147679835,7.4160018181,6.9907773697,6.1844077961,7.0669724341,4.0977108919,3.8946723821,3.7995317996,2.8564104442,2.4332972394,2.7345876944,1.4353551906,1.6296068869,2.7642428786,1.3806336875,-0.146346818,0.1959583588,1.3237078528,1.1230331661,1.72764104,1.2583943372,1.1482841525,0.7557597156,0.4216641679,0.5850142743,-8.585679964,-8.303735456,-2.622902597,1.879859865,-3.114620466,5.9531732107,10.478092891,10.155521179,0.6090704648,-3.650489072,-8.732026781,-8.107777097,-1.299194744,3.0028930311,-1.386979426,7.2115675479,11.626377044,10.911280895,1.0307346327,-3.065474798 +050,2,3,55,095,Wisconsin,Polk County,44205,44200,44155,43953,43522,43320,43343,43240,43261,43409,43578,43705,43794,-45,-202,-431,-202,23,-103,21,148,169,127,89,122,431,419,416,444,415,429,421,401,378,387,120,400,367,432,464,437,465,426,480,457,485,2,31,52,-16,-20,-22,-36,-5,-79,-79,-98,3,8,14,12,9,16,9,4,2,2,4,-49,-241,-508,-198,45,-95,53,152,244,204,183,-46,-233,-494,-186,54,-79,62,156,246,206,187,-1,0,11,0,-11,-2,-5,-3,2,0,0,461,461,447,440,423,428,419,426,421,397,391,385,9.7834475871,9.5798799657,9.5806176735,10.246587356,9.5861774251,9.9189604744,9.7150109611,9.2197684712,8.6614804716,8.8458153807,9.079765742,8.3909688482,9.9491029686,10.708145345,10.094360325,10.751320794,9.8303911388,11.036131836,10.471684062,11.085840981,0.703681845,1.1889111175,-0.368485295,-0.461557989,-0.5081829,-0.83236032,-0.115380178,-1.816363365,-1.810203591,-2.2400256,0.1815953148,0.3200914547,0.2763639714,0.207701095,0.3695875634,0.2080900799,0.0923041421,0.0459838826,0.045827939,0.0914296163,-5.47055886,-11.61474707,-4.560005527,1.0385054752,-2.194426158,1.2254193593,3.5075574016,5.6100336832,4.6744497783,4.1829049475,-5.288963545,-11.29465562,-4.283641556,1.2462065703,-1.824838594,1.4335094392,3.5998615438,5.6560175658,4.7202777173,4.2743345638 +050,2,3,55,097,Wisconsin,Portage County,70019,70021,70025,70093,70436,70535,70546,70544,70483,70674,70979,70943,71032,4,68,343,99,11,-2,-61,191,305,-36,89,197,725,718,650,710,703,656,681,683,643,631,151,511,485,549,525,556,519,557,517,521,551,46,214,233,101,185,147,137,124,166,122,80,11,31,75,105,127,168,151,165,100,125,102,-48,-176,49,-96,-300,-314,-349,-97,41,-286,-95,-37,-145,124,9,-173,-146,-198,68,141,-161,7,-5,-1,-14,-11,-1,-3,0,-1,-2,3,2,3509,3509,3546,3714,3762,3603,3580,3507,3366,3320,3124,3037,10.348420617,10.218531406,9.221754829,10.065139884,9.9652703948,9.3031830784,9.6488307346,9.6432832344,9.0613153704,8.8888888889,7.2938523245,6.9024898775,7.7888360017,7.442533013,7.8814940818,7.3602927099,7.8919217609,7.2995277191,7.3420611322,7.7619299172,3.0545682924,3.3160415288,1.4329188273,2.6226068712,2.083776313,1.9428903685,1.7569089737,2.3437555152,1.7192542382,1.1269589716,0.4424841919,1.0673953419,1.4896680878,1.8003841765,2.3814586434,2.1414339098,2.3378224247,1.4119009128,1.7615309818,1.4368726889,-2.512168315,0.6973649567,-1.361982252,-4.252876007,-4.451059607,-4.949406851,-1.374356213,0.5788793742,-4.030382886,-1.338263779,-2.069684123,1.7647602986,0.1276858361,-2.452491831,-2.069600964,-2.807972941,0.9634662114,1.990780287,-2.268851905,0.09860891 +050,2,3,55,099,Wisconsin,Price County,14159,14159,14096,13985,13846,13740,13658,13577,13417,13377,13371,13347,13245,-63,-111,-139,-106,-82,-81,-160,-40,-6,-24,-102,30,107,110,105,120,99,116,120,121,101,108,57,156,160,194,174,203,182,217,169,175,171,-27,-49,-50,-89,-54,-104,-66,-97,-48,-74,-63,0,3,17,21,21,6,6,5,1,3,4,-37,-64,-108,-36,-48,19,-101,54,43,46,-41,-37,-61,-91,-15,-27,25,-95,59,44,49,-37,1,-1,2,-2,-1,-2,1,-2,-2,1,-2,204,204,203,200,203,201,177,163,176,161,176,157,7.6208112247,7.9048542992,7.6125570942,8.7597634864,7.2700569121,8.594502482,8.9572292304,9.0474054135,7.5604461412,8.1227436823,11.11071543,11.49796989,14.065105488,12.701657055,14.907288416,13.484478032,16.197656192,12.636458801,13.099782918,12.86101083,-3.489904206,-3.593115591,-6.452548394,-3.941893569,-7.637231504,-4.88997555,-7.240426961,-3.589053387,-5.539336777,-4.738267148,0.2136676044,1.2216593008,1.5225114188,1.5329586101,0.4406095098,0.4445432318,0.3732178846,0.0747719456,0.2245677072,0.3008423586,-4.558242228,-7.761129676,-2.610019575,-3.503905395,1.3952634478,-7.483144402,4.0307531537,3.2151936593,3.4433715098,-3.083634176,-4.344574623,-6.539470375,-1.087508156,-1.970946784,1.8358729576,-7.038601171,4.4039710383,3.2899656049,3.667939217,-2.782791817 +050,2,3,55,101,Wisconsin,Racine County,195408,195434,195407,194910,194602,194694,194821,194725,194915,196026,196348,196204,195802,-27,-497,-308,92,127,-96,190,1111,322,-144,-402,606,2497,2426,2356,2387,2381,2372,2380,2284,2346,2267,458,1646,1702,1752,1664,1842,1834,1869,1932,1817,1885,148,851,724,604,723,539,538,511,352,529,382,26,59,87,76,75,150,163,201,247,23,82,-190,-1411,-1124,-575,-656,-777,-506,413,-273,-699,-872,-164,-1352,-1037,-499,-581,-627,-343,614,-26,-676,-790,-11,4,5,-13,-15,-8,-5,-14,-4,3,6,5015,5015,4807,4870,4799,4844,4783,4778,4928,4984,4986,4910,12.794728387,12.456612377,12.103900374,12.256267409,12.224486967,12.175341341,12.175750305,11.64195385,11.952556604,11.566149498,8.4341701745,8.7391402576,9.0008630965,8.5439585125,9.4571629538,9.4138178832,9.5615450925,9.8477473023,9.2573722717,9.6171997367,4.3605582129,3.717472119,3.1030372775,3.712308897,2.7673240131,2.7615234576,2.6142052126,1.7942065478,2.6951843323,1.948949761,0.302318372,0.4467128099,0.3904483992,0.3850942839,0.7701272764,0.8366697464,1.028288156,1.2590028901,0.1171819275,0.4183609435,-7.230020727,-5.771324118,-2.954050388,-3.368291337,-3.989259292,-2.597269274,2.1128507882,-1.39152951,-3.561311622,-4.448911496,-6.927702355,-5.324611309,-2.563601989,-2.983197053,-3.219132015,-1.760599528,3.1411389442,-0.13252662,-3.444129695,-4.030550553 +050,2,3,55,103,Wisconsin,Richland County,18021,18028,18023,18009,17815,17822,17747,17568,17545,17510,17416,17313,17258,-5,-14,-194,7,-75,-179,-23,-35,-94,-103,-55,49,178,180,180,177,177,169,190,164,165,162,21,174,188,171,174,197,172,204,208,185,186,28,4,-8,9,3,-20,-3,-14,-44,-20,-24,0,0,9,16,15,17,19,19,11,16,14,-34,-17,-197,-17,-91,-176,-39,-39,-61,-99,-45,-34,-17,-188,-1,-76,-159,-20,-20,-50,-83,-31,1,-1,2,-1,-2,0,0,-1,0,0,0,336,336,332,335,341,345,344,346,310,299,281,295,9.8801065719,10.049129075,10.101860426,9.952486716,10.024069092,9.6260644206,10.840108401,9.3912844299,9.5021451813,9.3720170085,9.6580817052,10.495757034,9.5967674047,9.7838005004,11.156732267,9.7969413038,11.638853231,11.910897326,10.653920355,10.760463973,0.2220248668,-0.446627959,0.5050930213,0.1686862155,-1.132663174,-0.170876883,-0.79874483,-2.519612896,-1.151775173,-1.388446964,0,0.5024564538,0.897943149,0.8434310776,0.9627636981,1.0822202603,1.0840108401,0.629903224,0.9214201388,0.8099273958,-0.943605684,-10.99821349,-0.954064596,-5.116815204,-9.967435934,-2.221399482,-2.225074882,-3.493099697,-5.701287109,-2.603338058,-0.943605684,-10.49575703,-0.056121447,-4.273384127,-9.004672236,-1.139179221,-1.141064042,-2.863196473,-4.77986697,-1.793410662 +050,2,3,55,105,Wisconsin,Rock County,160331,160327,160261,159899,160113,160402,160999,161095,161363,162278,162817,163120,163084,-66,-362,214,289,597,96,268,915,539,303,-36,488,1959,1926,1881,1930,2025,1929,1993,1885,1858,1832,309,1397,1401,1551,1407,1515,1541,1513,1580,1528,1578,179,562,525,330,523,510,388,480,305,330,254,3,-22,22,69,88,107,66,49,26,13,23,-249,-901,-319,-80,14,-509,-180,394,212,-44,-319,-246,-923,-297,-11,102,-402,-114,443,238,-31,-296,1,-1,-14,-30,-28,-12,-6,-8,-4,4,6,2934,2934,2857,2779,2824,2723,2709,2661,2780,2695,2694,2512,12.237631184,12.037048611,11.737360186,12.009919073,12.57396909,11.964348845,12.316115696,11.596610222,11.400976262,11.232235043,8.7268865567,8.7559216529,9.6781741884,8.7554176869,9.4071916894,9.5578338884,9.3498660553,9.7202356234,9.3760450639,9.6749273461,3.5107446277,3.2811269577,2.0591859975,3.2545013861,3.1667774004,2.406514957,2.9662496408,1.8763745982,2.0249311984,1.557307697,-0.137431284,0.1374948439,0.4305570722,0.5476025277,0.6644023173,0.409355637,0.3028046508,0.1599532444,0.0797700169,0.1410160513,-5.628435782,-1.993675237,-0.499196605,0.0871185839,-3.160568033,-1.116424465,2.4347965802,1.3042341469,-0.269990826,-1.95583132,-5.765867066,-1.856180393,-0.068639533,0.6347211116,-2.496165716,-0.707068828,2.737601231,1.4641873914,-0.19022081,-1.814815269 +050,2,3,55,107,Wisconsin,Rusk County,14755,14755,14730,14615,14305,14366,14347,14119,14084,14120,14054,14091,14022,-25,-115,-310,61,-19,-228,-35,36,-66,37,-69,36,131,161,118,152,135,144,139,136,148,143,28,162,169,189,207,203,173,181,169,191,180,8,-31,-8,-71,-55,-68,-29,-42,-33,-43,-37,0,8,19,21,28,21,4,7,5,5,4,-32,-93,-331,112,10,-183,-9,72,-37,75,-36,-32,-85,-312,133,38,-162,-5,79,-32,80,-32,-1,1,10,-1,-2,2,-1,-1,-1,0,0,174,174,172,170,170,178,159,156,171,176,173,161,8.9282671665,11.134163209,8.2313138712,10.587538746,9.4849996487,10.211679609,9.8567579067,9.6542911905,10.516965713,10.173229467,11.041063213,11.687413555,13.184053573,14.418556055,14.262629101,12.268198419,12.835058857,11.996876553,13.572570616,12.805463664,-2.112796047,-0.553250346,-4.952739702,-3.831017309,-4.777629453,-2.05651881,-2.97830095,-2.342585362,-3.055604903,-2.632234198,0.5452376896,1.3139695712,1.4648948415,1.9503360847,1.4754443898,0.2836577669,0.4963834917,0.3549371761,0.3553028957,0.2845658592,-6.338388141,-22.89073306,7.8127724879,0.6965486017,-12.85744397,-0.638229976,5.1056587718,-2.626535103,5.3295434358,-2.561092733,-5.793150452,-21.57676349,9.2776673294,2.6468846864,-11.38199958,-0.354572209,5.6020422635,-2.271597927,5.6848463315,-2.276526874 +050,2,3,55,109,Wisconsin,St. Croix County,84345,84332,84399,84836,85075,85700,86599,87207,87643,88615,89721,90691,91838,67,437,239,625,899,608,436,972,1106,970,1147,314,1121,1010,1032,1054,1071,990,1030,1002,1015,995,151,571,536,547,542,569,595,660,579,625,666,163,550,474,485,512,502,395,370,423,390,329,-1,-4,20,53,41,41,19,17,26,-4,-3,-94,-109,-257,96,358,71,25,587,657,585,819,-95,-113,-237,149,399,112,44,604,683,581,816,-1,0,2,-9,-12,-6,-3,-2,0,-1,2,850,850,830,790,797,812,832,807,766,742,742,749,13.247850622,11.888576961,12.086078173,12.234545761,12.324085475,11.323991993,11.68741277,11.237215144,11.252023147,10.902377157,6.7480131179,6.3091853971,6.4060898844,6.2913888067,6.5475300047,6.8058335716,7.4890217749,6.4933608469,6.9285856817,7.2974705389,6.4998375041,5.5793915638,5.6799882887,5.9431569539,5.7765554699,4.5181584215,4.198390995,4.7438542975,4.3234374654,3.6049066176,-0.047271545,0.2354173656,0.6206997511,0.4759168654,0.471790387,0.2173291393,0.1928990457,0.2915844249,-0.044342948,-0.032871489,-1.288149614,-3.025113147,1.1242863417,4.1555667764,0.8170028653,0.2859593938,6.6606905786,7.3681141217,6.485156198,8.9739164735,-1.33542116,-2.789695782,1.7449860928,4.6314836418,1.2887932522,0.503288533,6.8535896243,7.6596985466,6.4408132497,8.9410449846 +050,2,3,55,111,Wisconsin,Sauk County,61976,61955,62051,62241,62377,62788,62972,63290,63627,63956,64306,64420,64449,96,190,136,411,184,318,337,329,350,114,29,202,770,766,751,766,792,779,768,752,715,725,113,605,573,565,612,586,674,698,652,605,650,89,165,193,186,154,206,105,70,100,110,75,18,55,50,47,42,80,59,73,92,24,36,-3,-28,-97,187,-1,42,176,191,162,-21,-83,15,27,-47,234,41,122,235,264,254,3,-47,-8,-2,-10,-9,-11,-10,-3,-5,-4,1,1,858,858,822,727,771,732,768,740,740,706,720,724,12.390177968,12.293569147,12.000159789,12.181933842,12.545342225,12.275739263,12.039221526,11.725998347,11.108866896,11.251736259,9.735139832,9.1961032917,9.0280829305,9.7328244275,9.2822860401,10.621114587,10.941896648,10.166690056,9.3998104501,10.087763543,2.655038136,3.0974658557,2.9720768585,2.4491094148,3.2630561848,1.654624676,1.0973248787,1.5593082908,1.7090564455,1.1639727165,0.885012712,0.8024522942,0.7510086686,0.6679389313,1.2672062853,0.9297414846,1.1443530878,1.4345636276,0.3728850426,0.5587069039,-0.450551926,-1.556757451,2.9880557664,-0.015903308,0.6652832998,2.7734661235,2.9941293119,2.5260794312,-0.326274412,-1.288129806,0.4344607859,-0.754305157,3.7390644349,0.6520356234,1.9324895851,3.7032076081,4.1384823997,3.9606430587,0.0466106303,-0.729422902 +050,2,3,55,113,Wisconsin,Sawyer County,16557,16538,16553,16545,16520,16479,16364,16297,16327,16378,16439,16540,16700,15,-8,-25,-41,-115,-67,30,51,61,101,160,51,161,171,176,163,173,164,152,164,132,136,44,181,194,220,227,213,225,202,218,184,222,7,-20,-23,-44,-64,-40,-61,-50,-54,-52,-86,1,1,1,2,3,2,1,3,2,3,2,9,12,0,3,-50,-27,90,98,112,150,246,10,13,1,5,-47,-25,91,101,114,153,248,-2,-1,-3,-2,-4,-2,0,0,1,0,-2,325,325,314,311,301,304,312,314,314,313,311,314,9.7286845127,10.343263269,10.666989909,9.9260116311,10.593674413,10.053948014,9.295214799,9.9948197581,8.0050941508,8.182912154,10.93721675,11.734462423,13.333737386,13.823341351,13.043078901,13.793526238,12.352851246,13.285796995,11.158616089,13.357400722,-1.208532238,-1.391199153,-2.666747477,-3.89732972,-2.449404489,-3.739578225,-3.057636447,-3.290977237,-3.153521938,-5.174488568,0.0604266119,0.0604869197,0.1212157944,0.1826873306,0.1224702244,0.0613045611,0.1834581868,0.1218880458,0.181933958,0.1203369434,0.7251193426,0,0.1818236916,-3.044788844,-1.65334803,5.5174104953,5.9929674362,6.8257305665,9.0966978987,14.801444043,0.7855459544,0.0604869197,0.303039486,-2.862101513,-1.530877805,5.5787150564,6.176425623,6.9476186123,9.2786318566,14.921780987 +050,2,3,55,115,Wisconsin,Shawano County,41949,41955,41938,41669,41512,41408,41349,41058,40927,40832,40725,40794,40786,-17,-269,-157,-104,-59,-291,-131,-95,-107,69,-8,120,429,431,432,423,444,394,455,442,445,430,143,461,406,504,435,463,462,504,479,472,452,-23,-32,25,-72,-12,-19,-68,-49,-37,-27,-22,4,18,13,10,14,14,5,8,8,5,4,8,-255,-194,-37,-55,-286,-65,-51,-76,92,9,12,-237,-181,-27,-41,-272,-60,-43,-68,97,13,-6,0,-1,-5,-6,0,-3,-3,-2,-1,1,800,800,792,769,730,710,738,729,681,670,660,661,10.262298611,10.362943461,10.419681621,10.222700195,10.775783611,9.6115143014,11.13027312,10.839045085,10.917700168,10.541799461,11.027784755,9.761844652,12.156295224,10.512705874,11.236909486,11.270354333,12.328917917,11.746385963,11.580122425,11.08114734,-0.765486144,0.6010988086,-1.736613603,-0.290005679,-0.461125875,-1.658840032,-1.198644798,-0.907340878,-0.662422257,-0.539347879,0.4305859557,0.3125713805,0.2411963338,0.3383399592,0.3397769607,0.1219735317,0.1956971098,0.1961818115,0.1226707884,0.0980632508,-6.099967706,-4.664526755,-0.892426435,-1.329192697,-6.941157911,-1.585655913,-1.247569075,-1.863727209,2.2571425067,0.2206423143,-5.66938175,-4.351955374,-0.651230101,-0.990852738,-6.601380951,-1.463682381,-1.051871965,-1.667545398,2.3798132951,0.3187055651 +050,2,3,55,117,Wisconsin,Sheboygan County,115507,115509,115520,115209,114770,114702,114994,115209,115043,115085,115161,115232,115240,11,-311,-439,-68,292,215,-166,42,76,71,8,365,1326,1248,1291,1176,1279,1292,1229,1244,1215,1229,225,1023,1062,1163,1024,1123,1123,1175,1127,1114,1150,140,303,186,128,152,156,169,54,117,101,79,25,57,90,121,118,102,82,71,35,42,48,-153,-672,-727,-312,44,-31,-414,-78,-72,-73,-122,-128,-615,-637,-191,162,71,-332,-7,-37,-31,-74,-1,1,12,-5,-22,-12,-3,-5,-4,1,3,3023,3023,3018,2904,2883,2845,2820,2777,2796,2789,2808,2818,11.494003788,10.853164854,11.251917445,10.239621064,11.111931643,11.222486667,10.681012306,10.80583376,10.547195444,10.665069943,8.8675459088,9.2356258615,10.136312927,8.9161326275,9.7566061259,9.7545298195,10.211708267,9.7895294598,9.6704326954,9.9795202888,2.6264578792,1.6175389927,1.1156045182,1.3234884369,1.355325517,1.4679568473,0.4693040395,1.0163043006,0.8767627489,0.6855496546,0.4940861357,0.7826801578,1.0545948961,1.0274449707,0.8861743765,0.7122630857,0.6170479038,0.304022654,0.3645944104,0.416536499,-5.825015494,-6.322316385,-2.719286013,0.3831150738,-0.269327507,-3.596059969,-0.677883613,-0.625418031,-0.633699809,-1.058696935,-5.330929359,-5.539636228,-1.664691117,1.4105600446,0.6168468699,-2.883796883,-0.060835709,-0.321395377,-0.269105398,-0.642160436 +050,2,3,55,119,Wisconsin,Taylor County,20689,20689,20660,20656,20369,20422,20414,20314,20295,20302,20346,20340,20318,-29,-4,-287,53,-8,-100,-19,7,44,-6,-22,65,234,218,211,225,234,247,209,218,210,212,66,190,153,182,170,182,193,183,202,176,193,-1,44,65,29,55,52,54,26,16,34,19,2,2,7,1,10,14,7,6,5,6,4,-31,-49,-378,25,-75,-167,-78,-25,25,-46,-44,-29,-47,-371,26,-65,-153,-71,-19,30,-40,-40,1,-1,19,-2,2,1,-2,0,-2,0,-1,231,231,230,221,229,216,209,218,204,211,202,186,11.327330816,10.627666057,10.345419333,11.01968851,11.490866235,12.164791056,10.296327315,10.726234993,10.322961215,10.428451965,9.1974053635,7.4588665448,8.9235370547,8.3259868743,8.9373404046,9.5052820803,9.015444491,9.9389883881,8.6516246375,9.4938265532,2.1299254526,3.1687995125,1.421882278,2.6937016358,2.5535258299,2.6595089758,1.2808828239,0.787246605,1.6713365777,0.934625412,0.0968147933,0.3412553321,0.0490304234,0.4897639338,0.6874877234,0.3447511635,0.295588344,0.2460145641,0.294941749,0.1967632446,-2.371962436,-18.42778793,1.2257605844,-3.673229503,-8.200746415,-3.841512965,-1.2316181,1.2300728203,-2.261220076,-2.164395691,-2.275147643,-18.0865326,1.2747910078,-3.18346557,-7.513258692,-3.496761802,-0.936029756,1.4760873844,-1.966278327,-1.967632446 +050,2,3,55,121,Wisconsin,Trempealeau County,28816,28815,28846,28994,29294,29468,29417,29444,29531,29352,29479,29583,29681,31,148,300,174,-51,27,87,-179,127,104,98,96,375,397,415,395,411,407,444,430,406,404,83,245,271,305,252,264,313,296,298,287,281,13,130,126,110,143,147,94,148,132,119,123,7,10,28,17,19,27,28,18,45,14,12,15,7,152,51,-214,-147,-34,-345,-50,-29,-37,22,17,180,68,-195,-120,-6,-327,-5,-15,-25,-4,1,-6,-4,1,0,-1,0,0,0,0,512,512,509,526,528,531,446,449,444,457,448,450,12.966804979,13.622014823,14.124774514,13.415980301,13.965104229,13.802458669,15.080753358,14.618143496,13.748264536,13.633909287,8.4716459198,9.2986549547,10.380858378,8.5590557867,8.9702859279,10.614667232,10.053835572,10.130713399,9.7186007924,9.4829913607,4.4951590595,4.3233598682,3.7439161363,4.8569245139,4.9948183007,3.187791437,5.0269177861,4.4874300964,4.0296637432,4.1509179266,0.3457814661,0.9607466374,0.5786052211,0.6453256347,0.9174156063,0.9495548961,0.6113818929,1.5298057147,0.4740780874,0.4049676026,0.2420470263,5.2154817458,1.7358156632,-7.268404517,-4.994818301,-1.153030945,-11.71815295,-1.699784127,-0.982018895,-1.248650108,0.5878284924,6.1762283832,2.3144208842,-6.623078883,-4.077402694,-0.203476049,-11.10677105,-0.169978413,-0.507940808,-0.843682505 +050,2,3,55,123,Wisconsin,Vernon County,29773,29774,29771,29874,30029,30101,30199,30331,30554,30729,30775,30877,30861,-3,103,155,72,98,132,223,175,46,102,-16,113,393,413,445,417,437,396,409,428,429,409,95,290,279,263,286,318,287,321,306,283,329,18,103,134,182,131,119,109,88,122,146,80,0,2,8,7,4,7,6,12,5,7,4,-18,1,18,-117,-31,10,109,79,-81,-51,-102,-18,3,26,-110,-27,17,115,91,-76,-44,-98,-3,-3,-5,0,-6,-4,-1,-4,0,0,2,390,390,381,362,376,362,353,356,326,320,318,323,13.177969654,13.788958817,14.801263928,13.830845771,14.439121097,13.008130081,13.347910514,13.917793965,13.916823461,13.249538372,9.7242015257,9.3150593459,8.7477132879,9.4859038143,10.507186519,9.4276094276,10.475988447,9.9505723205,9.1805618634,10.657941624,3.4537681281,4.4738994708,6.0535506403,4.3449419569,3.9319345779,3.5805206537,2.8719220665,3.9672216441,4.7362615974,2.5915967475,0.0670634588,0.2670984759,0.2328288708,0.1326699834,0.2312902693,0.19709288,0.3916257363,0.162591051,0.2270810355,0.1295798374,0.0335317294,0.6009715707,-3.891568269,-1.028192371,0.3304146704,3.5805206537,2.5782027642,-2.633975026,-1.654447544,-3.304285853,0.1005951882,0.8680700466,-3.658739398,-0.895522388,0.5617049397,3.7776135337,2.9698285006,-2.471383975,-1.427366509,-3.174706016 +050,2,3,55,125,Wisconsin,Vilas County,21430,21443,21454,21414,21315,21401,21422,21455,21488,21667,21949,22153,22356,11,-40,-99,86,21,33,33,179,282,204,203,56,168,176,173,193,192,160,173,195,176,179,82,278,294,288,274,308,285,330,269,327,332,-26,-110,-118,-115,-81,-116,-125,-157,-74,-151,-153,0,6,13,24,21,17,7,4,2,2,2,38,65,10,173,84,133,153,332,351,354,358,38,71,23,197,105,150,160,336,353,356,360,-1,-1,-4,4,-3,-1,-2,0,3,-1,-4,190,190,189,169,136,184,204,189,186,200,209,231,7.8380143697,8.2379648482,8.1000093642,9.0138476987,8.955850456,7.4517383508,8.0176109373,8.9416727806,7.9814974378,8.0433170819,12.970047588,13.761145826,13.484408652,12.7968615,14.366676773,13.273408937,15.293708724,12.334922964,14.829259444,14.918331124,-5.132033218,-5.523180978,-5.384399288,-3.783013801,-5.410826317,-5.821670587,-7.276097787,-3.393250183,-6.847762006,-6.875014042,0.2799290846,0.6084860399,1.123700721,0.9807813558,0.7929659258,0.3260135528,0.1853782876,0.0917094644,0.0906988345,0.0898694646,3.0325650835,0.4680661846,8.1000093642,3.9231254233,6.2037922429,7.125724798,15.386397868,16.095011005,16.05369371,16.086634164,3.3124941681,1.0765522245,9.2237100852,4.9039067791,6.9967581687,7.4517383508,15.571776156,16.18672047,16.144392545,16.176503628 +050,2,3,55,127,Wisconsin,Walworth County,102228,102222,102195,102641,102881,102805,103190,102508,102668,102890,103547,103898,103953,-27,446,240,-76,385,-682,160,222,657,351,55,292,1022,1031,1038,1028,1090,1013,937,911,966,933,196,865,849,941,937,954,873,955,961,963,1021,96,157,182,97,91,136,140,-18,-50,3,-88,22,-20,10,28,31,42,19,13,5,-14,-9,-145,312,70,-188,285,-866,3,233,701,360,149,-123,292,80,-160,316,-824,22,246,706,346,140,0,-3,-22,-13,-22,6,-2,-6,1,2,3,2709,2709,2977,3013,3053,3187,2630,2680,2763,3077,3163,3029,9.9787146791,10.032989169,10.093054462,9.9808247773,10.598061235,9.8744492533,9.1166483426,8.8259372109,9.3133119622,8.9775849046,8.4457810151,8.2618892381,9.1498692181,9.0973081871,9.275734329,8.5097672242,9.291781395,9.310346498,9.2843886331,9.8243453243,1.532933664,1.7710999309,0.9431852435,0.8835165902,1.3223269064,1.3646820291,-0.175133052,-0.484409287,0.0289233291,-0.84676042,-0.195278174,0.097313183,0.2722596579,0.3009781791,0.4083656623,0.1852068468,0.1264849823,0.0484409287,-0.134975536,-0.086600497,3.0463395106,0.6811922811,-1.828029132,2.7670574529,-8.420111037,0.0292431863,2.2670000681,6.7914182051,3.470799489,1.433719347,2.8510613369,0.7785054641,-1.555769474,3.0680356319,-8.011745374,0.2144500331,2.3934850504,6.8398591338,3.3358239533,1.3471188496 +050,2,3,55,129,Wisconsin,Washburn County,15911,15907,15927,15838,15844,15655,15654,15515,15587,15728,15841,15764,15712,20,-89,6,-189,-1,-139,72,141,113,-77,-52,35,161,154,149,159,147,115,149,132,136,117,22,217,220,236,200,197,208,210,199,191,238,13,-56,-66,-87,-41,-50,-93,-61,-67,-55,-121,0,2,3,8,10,9,5,5,3,4,3,8,-35,73,-109,33,-96,160,196,178,-25,67,8,-33,76,-101,43,-87,165,201,181,-21,70,-1,0,-4,-1,-3,-2,0,1,-1,-1,-1,205,205,206,203,204,204,204,205,198,197,195,201,10.136943176,9.7216084843,9.4606177974,10.156823916,9.4324489076,7.3950228281,9.5162062909,8.3626342298,8.606233191,7.4342356081,13.662836455,13.88801212,14.984602686,12.77587914,12.640764863,13.375345637,13.412102826,12.607304634,12.086695143,15.122633117,-3.525893279,-4.166403636,-5.523984888,-2.619055224,-3.208315955,-5.980322809,-3.895896535,-4.244670405,-3.480461952,-7.688397509,0.12592476,0.1893819835,0.5079526334,0.638793957,0.5774968719,0.3215227317,0.3193357816,0.1900598689,0.2531245056,0.1906214258,-2.203683299,4.6082949309,-6.92085463,2.1080200581,-6.159966634,10.288727413,12.517962638,11.276885552,-1.58202816,4.2572118439,-2.077758539,4.7976769143,-6.412901997,2.7468140151,-5.582469762,10.610250145,12.837298419,11.466945421,-1.328903654,4.4478332698 +050,2,3,55,131,Wisconsin,Washington County,131887,131885,131990,132341,132743,132938,133610,133920,134324,134961,135615,136302,136445,105,351,402,195,672,310,404,637,654,687,143,373,1387,1317,1294,1398,1324,1346,1356,1280,1293,1280,251,1021,1036,1037,1053,1159,1121,1168,1189,1181,1259,122,366,281,257,345,165,225,188,91,112,21,14,34,85,108,104,93,70,64,36,43,41,-24,-46,58,-166,249,66,117,395,535,535,77,-10,-12,143,-58,353,159,187,459,571,578,118,-7,-3,-22,-4,-26,-14,-8,-10,-8,-3,4,1143,1143,1142,1143,1128,1135,1147,1070,1062,1027,1000,977,10.494417984,9.9364729671,9.7410051904,10.489667902,9.8979553695,10.035639194,10.071114247,9.4612973804,9.5102549675,9.3859877469,7.7251627694,7.8163902763,7.8063542368,7.9010159521,8.6644488469,8.3580620629,8.6748240712,8.7886582698,8.6864741815,9.2319988854,2.7692552141,2.1200826908,1.9346509536,2.5886519501,1.2335065226,1.6775771313,1.3962901758,0.6726391106,0.823780786,0.1539888615,0.2572532166,0.641306152,0.81300507,0.7803472545,0.6952491309,0.5219128853,0.4753328258,0.2660989888,0.3162729804,0.30064492,-0.34804847,0.437597139,-1.249618904,1.8683314075,0.4934026091,0.8723401083,2.9336947843,3.9545266395,3.9350242905,0.5646258254,-0.090795253,1.078903291,-0.436613834,2.648678662,1.18865174,1.3942529935,3.4090276102,4.2206256283,4.2512972709,0.8652707454 +050,2,3,55,133,Wisconsin,Waukesha County,389891,389962,390051,390895,392893,394257,395518,396377,398664,401099,402705,404545,406172,89,844,1998,1364,1261,859,2287,2435,1606,1840,1627,961,3810,3804,3755,3861,3802,3818,3920,3959,3788,3810,777,3061,3100,3184,3273,3369,3305,3483,3624,3454,3765,184,749,704,571,588,433,513,437,335,334,45,71,305,386,595,585,641,517,552,247,371,322,-155,-204,1000,229,138,-186,1288,1481,1050,1146,1261,-84,101,1386,824,723,455,1805,2033,1297,1517,1583,-11,-6,-92,-31,-50,-29,-31,-35,-26,-11,-1,5698,5698,5711,5952,5803,5735,5625,5515,5574,5485,5340,5335,9.7573967982,9.7067064053,9.5407482691,9.7774682663,9.602283131,9.6045361183,9.8029041103,9.8506601112,9.3849489006,9.3990874744,7.8392103935,7.9103022756,8.0899447373,8.28843658,8.5087038054,8.3140366346,8.7100803613,9.0171235774,8.5574481264,9.2880746302,1.9181864047,1.7964041297,1.4508035317,1.4890316862,1.0935793255,1.2904994837,1.092823749,0.8335365338,0.8275007742,0.1110128442,0.7811039432,0.9849602188,1.5117830147,1.4814345858,1.6189014958,1.3005618578,1.3804089462,0.6145776831,0.9191700217,0.794358574,-0.522443293,2.5517104115,0.5818458998,0.3494666202,-0.469759248,3.2400844736,3.7035971907,2.6125771954,2.8392691236,3.1108265893,0.25866065,3.5366706303,2.0936289144,1.830901206,1.1491422474,4.5406463314,5.0840061368,3.2271548786,3.7584391452,3.9051851633 +050,2,3,55,135,Wisconsin,Waupaca County,52410,52409,52396,52293,51922,52068,51934,51684,51301,51108,51051,50863,50664,-13,-103,-371,146,-134,-250,-383,-193,-57,-188,-199,130,494,537,516,534,520,494,488,526,528,527,159,760,732,662,668,741,770,727,747,684,742,-29,-266,-195,-146,-134,-221,-276,-239,-221,-156,-215,4,11,22,13,13,21,11,11,9,8,5,16,155,-201,289,-2,-45,-117,38,158,-40,10,20,166,-179,302,11,-24,-106,49,167,-32,15,-4,-3,3,-10,-11,-5,-1,-3,-3,0,1,1635,1635,1621,1548,1513,1590,1581,1531,1526,1513,1455,1389,9.4374767168,10.305618193,9.9240311568,10.269033288,10.036866182,9.5936301403,9.5304123661,10.297673235,10.361677493,10.381474879,14.519194949,14.047881783,12.731993461,12.845906809,14.302534309,14.953634024,14.197970881,14.62426218,13.423082207,14.616801442,-5.081718232,-3.74226359,-2.807962304,-2.576873522,-4.265668127,-5.360003884,-4.667558515,-4.326588945,-3.061404714,-4.235326563,0.2101462427,0.4222040973,0.2500240408,0.2499951924,0.4053349804,0.2136233432,0.2148248689,0.1761959299,0.1569951135,0.0984959666,2.9611516014,-3.857410162,5.5582267526,-0.038460799,-0.868574958,-2.27217556,0.7421222744,3.0932174356,-0.784975568,0.1969919332,3.1712978441,-3.435206064,5.8082507933,0.2115343936,-0.463239978,-2.058552216,0.9569471433,3.2694133654,-0.627980454,0.2954878998 +050,2,3,55,137,Wisconsin,Waushara County,24496,24510,24526,24563,24433,24260,24110,23966,24104,24215,24245,24388,24326,16,37,-130,-173,-150,-144,138,111,30,143,-62,64,224,238,228,224,247,209,221,186,216,195,45,269,282,278,244,272,281,280,303,283,283,19,-45,-44,-50,-20,-25,-72,-59,-117,-67,-88,1,0,6,5,6,5,12,10,15,7,4,0,82,-89,-126,-135,-121,196,160,133,204,23,1,82,-83,-121,-129,-116,208,170,148,211,27,-4,0,-3,-2,-1,-3,2,0,-1,-1,-1,1261,1261,1258,1260,1240,1231,1223,1224,1218,1231,1222,1178,9.1262808368,9.7150787819,9.3647957612,9.2619392185,10.275397288,8.6956521739,9.1475403051,7.6764341725,8.8828573191,8.0059120581,10.959685469,11.511143767,11.418479042,10.088898077,11.315417256,11.691283545,11.589643825,12.505158894,11.638188062,11.618836474,-1.833404632,-1.796064985,-2.053683281,-0.826958859,-1.040019968,-2.995631371,-2.44210352,-4.828724721,-2.755330742,-3.612924416,0,0.2449179525,0.2053683281,0.2480876576,0.2080039937,0.4992718952,0.4139158509,0.619067272,0.2878703761,0.1642238371,3.3408706635,-3.632949629,-5.175281868,-5.581972297,-5.033696647,8.1547742875,6.6226536145,5.4890631449,8.3893652458,0.9442870633,3.3408706635,-3.388031676,-4.96991354,-5.333884639,-4.825692653,8.6540461827,7.0365694654,6.1081304168,8.6772356219,1.1085109004 +050,2,3,55,139,Wisconsin,Winnebago County,166994,167072,167144,167579,168623,169388,169445,169383,169809,170568,170811,171801,171631,72,435,1044,765,57,-62,426,759,243,990,-170,504,1877,1924,1896,1829,1827,1937,1903,1834,1719,1770,364,1449,1425,1424,1404,1471,1467,1529,1565,1522,1598,140,428,499,472,425,356,470,374,269,197,172,22,47,111,144,147,182,182,191,114,119,109,-73,-33,455,178,-488,-592,-221,202,-134,671,-458,-51,14,566,322,-341,-410,-39,393,-20,790,-349,-17,-7,-21,-29,-27,-8,-5,-8,-6,3,7,8239,8239,8119,8130,8052,8042,8060,7727,7622,7619,7713,7408,11.215243649,11.445500027,11.21856981,10.795878796,10.784232708,11.421259935,11.181719094,10.744656233,10.034674792,10.307717394,8.6579051932,8.4770465375,8.4257612918,8.2872683593,8.6828715454,8.6499681596,8.9841558037,9.1686952039,8.8846858837,9.3060635002,2.557338456,2.9684534893,2.7928085181,2.5086104364,2.1013611626,2.7712917757,2.1975632901,1.5759610287,1.1499889087,1.0016538936,0.280829223,0.6603173092,0.8520432767,0.8676840804,1.0742913809,1.0731385174,1.1222849958,0.667879395,0.694663351,0.6347690372,-0.197177965,2.7067060874,1.0532201615,-2.880475042,-3.494398338,-1.303096771,1.1869192102,-0.785051219,3.9169672983,-2.66719467,0.0836512579,3.3670233966,1.9052634382,-2.012790962,-2.420106957,-0.229958254,2.3092042059,-0.117171824,4.6116306492,-2.032425633 +050,2,3,55,141,Wisconsin,Wood County,74749,74750,74812,74653,74326,73930,73595,73360,73224,73053,72827,72795,72560,62,-159,-327,-396,-335,-235,-136,-171,-226,-32,-235,226,857,823,861,767,811,829,849,789,808,778,162,740,752,780,686,873,816,851,843,817,819,64,117,71,81,81,-62,13,-2,-54,-9,-41,7,20,16,23,31,47,36,21,13,15,9,0,-295,-419,-507,-448,-218,-183,-186,-183,-38,-204,7,-275,-403,-484,-417,-171,-147,-165,-170,-23,-195,-9,-1,5,7,1,-2,-2,-4,-2,0,1,891,891,853,841,795,815,792,797,759,779,767,713,11.467567658,11.048537042,11.615044248,10.398237587,11.037392399,11.310920701,11.608113374,10.817109953,11.097224321,10.704826115,9.901983742,10.095382571,10.522339737,9.300118624,11.881188119,11.133548,11.635458753,11.557444475,11.220832017,11.268962196,1.565583916,0.9531544714,1.0927045111,1.0981189629,-0.84379572,0.177372701,-0.027345379,-0.740334522,-0.123607697,-0.564136081,0.2676211822,0.2147953738,0.3102741204,0.4202677512,0.639651594,0.4911859412,0.2871264792,0.1782286811,0.2060128277,0.1238347494,-3.947412438,-5.624953853,-6.839520829,-6.073546856,-2.966894628,-2.496861868,-2.543120244,-2.508911434,-0.521899164,-2.806920987,-3.679791255,-5.410158479,-6.529246708,-5.653279105,-2.327243034,-2.005675926,-2.255993765,-2.330682753,-0.315886336,-2.683086237 +040,4,8,56,000,Wyoming,Wyoming,563626,563775,564531,567491,576656,582620,583159,586389,585243,579994,579054,580116,582328,756,2960,9165,5964,539,3230,-1146,-5249,-940,1062,2212,1986,7469,7439,7520,7723,7800,7706,7046,6762,6406,6367,1289,4444,4372,4613,4528,4821,4790,4753,4867,4994,5464,697,3025,3067,2907,3195,2979,2916,2293,1895,1412,903,219,-85,609,594,-127,860,530,795,708,173,174,-229,20,5272,2353,-2560,-598,-4609,-8372,-3549,-521,1129,-10,-65,5881,2947,-2687,262,-4079,-7577,-2841,-348,1303,69,0,217,110,31,-11,17,35,6,-2,6,13855,13940,13993,14171,14258,14146,14308,14115,14385,14245,14357,14365,13.195856618,13.003573841,12.973614566,13.249509555,13.338486321,13.154301009,12.09367708,11.668196658,11.052736009,10.954506196,7.8514375162,7.6423746249,7.9584154248,7.7681962019,8.2442105839,8.1766288391,8.1579970427,8.398271685,8.6165100891,9.4008829673,5.3444191014,5.3611992165,5.0151991415,5.4813133536,5.0942757373,4.9776721701,3.9356800376,3.2699249729,2.4362259203,1.5536232283,-0.15017376,1.0645485239,1.0247775336,-0.217880061,1.47065362,0.9047209363,1.364529276,1.2216922854,0.2984894364,0.2993692599,0.0353350023,9.2155990445,4.0594301961,-4.391913047,-1.022617285,-7.867658104,-14.36960893,-6.123991414,-0.898919054,1.9424591636,-0.114838758,10.280147568,5.0842077297,-4.609793108,0.4480363354,-6.962937168,-13.00507965,-4.902299128,-0.600429618,2.2418284236 +050,4,8,56,001,Wyoming,Albany County,36299,36299,36471,36873,37404,37619,37702,38054,38012,38600,38937,38819,38950,172,402,531,215,83,352,-42,588,337,-118,131,103,414,442,411,428,413,380,377,336,354,335,29,190,193,189,197,177,184,201,205,185,213,74,224,249,222,231,236,196,176,131,169,122,48,20,190,90,19,278,202,303,290,50,45,45,154,89,-96,-164,-159,-443,107,-84,-339,-39,93,174,279,-6,-145,119,-241,410,206,-289,6,5,4,3,-1,-3,-3,3,2,0,2,3,2248,2248,2328,2268,2278,2242,2290,2064,2192,2309,2261,2262,11.289267016,11.901396125,10.956639964,11.36469245,10.903426791,9.9913233245,9.8418002402,8.6668300295,9.1054066567,8.6152580077,5.1810645724,5.1967634665,5.0384548738,5.2309448892,4.6728971963,4.8379039255,5.2472197567,5.2877980835,4.7584752302,5.4777610616,6.1082024433,6.7046326588,5.9181850899,6.1337475604,6.230529595,5.1534193989,4.5945804835,3.379031946,4.3469314265,3.1374969461,0.5453752182,5.1159847598,2.3992642256,0.5045073751,7.3393526585,5.3111771356,7.9099879914,7.4802997279,1.2860743865,1.1572734637,4.1993891798,2.3964349664,-2.559215174,-4.354695238,-4.197687312,-11.64777956,2.7932960894,-2.166707507,-8.719584341,-1.002970335,4.7447643979,7.5124197262,-0.159950948,-3.850187863,3.1416653466,-6.336602424,10.703284081,5.3135922205,-7.433509954,0.1543031285 +050,4,8,56,003,Wyoming,Big Horn County,11668,11669,11665,11723,11761,11941,11864,11965,11949,11888,11887,11746,11575,-4,58,38,180,-77,101,-16,-61,-1,-141,-171,24,151,133,139,162,160,127,140,154,109,116,50,131,127,136,142,121,135,149,142,145,153,-26,20,6,3,20,39,-8,-9,12,-36,-37,-1,-4,0,3,-4,-2,4,5,5,1,1,23,42,33,171,-96,65,-12,-56,-18,-106,-133,22,38,33,174,-100,63,-8,-51,-13,-105,-132,0,0,-1,3,3,-1,0,-1,0,0,-2,183,183,183,183,183,183,183,183,183,183,183,183,12.912604755,11.326860841,11.72896802,13.610586011,13.429015066,10.621393326,11.746444603,12.954784437,9.2243896247,9.9481154324,11.202325979,10.815874638,11.475824825,11.930266751,10.155692643,11.290457473,12.501573185,11.945320715,12.270977024,13.121221217,1.7102787754,0.5109862034,0.2531431947,1.6803192607,3.2733224223,-0.669064147,-0.755128582,1.0094637224,-3.046587399,-3.173105784,-0.342055755,0,0.2531431947,-0.336063852,-0.167862688,0.3345320733,0.4195158787,0.4206098843,0.0846274277,0.0857596158,3.5915854284,2.8104241185,14.429162096,-8.065532451,5.4555373704,-1.00359622,-4.698577841,-1.514195584,-8.970507341,-11.4060289,3.2495296733,2.8104241185,14.682305291,-8.401596303,5.2876746821,-0.669064147,-4.279061962,-1.093585699,-8.885879914,-11.32026929 +050,4,8,56,005,Wyoming,Campbell County,46133,46133,46253,46570,47887,48080,48195,49336,48900,46445,46349,46420,46676,120,317,1317,193,115,1141,-436,-2455,-96,71,256,209,722,766,734,752,766,840,643,618,577,583,83,240,241,223,249,275,217,214,267,277,367,126,482,525,511,503,491,623,429,351,300,216,17,-19,8,-17,-31,42,35,11,16,-20,-12,-25,-146,758,-305,-364,602,-1100,-2913,-466,-212,49,-8,-165,766,-322,-395,644,-1065,-2902,-450,-232,37,2,0,26,4,7,6,6,18,3,3,3,422,422,422,422,422,422,422,422,547,507,518,518,15.556489232,16.219020295,15.296924985,15.621916385,15.70782623,17.101673521,13.487859877,13.319826713,12.439500264,12.52470568,5.1711321547,5.1028510327,4.6474308877,5.1726824202,5.6392326542,4.4179323262,4.4889611411,5.7546824148,5.9718224838,7.8843344505,10.385357077,11.116169262,10.649494097,10.449233965,10.068593575,12.683741195,8.9988987362,7.5651442981,6.4676777803,4.6403712297,-0.409381296,0.1693892459,-0.354288453,-0.643988574,0.8612646236,0.71256973,0.2307409932,0.3448498825,-0.431178519,-0.257798402,-3.145772061,16.049631049,-6.356351663,-7.561672293,12.344792938,-22.39504866,-61.1044103,-10.04375283,-4.570492298,1.0526768067,-3.555153356,16.219020295,-6.710640116,-8.205660867,13.206057561,-21.68247893,-60.87366931,-9.698902946,-5.001670817,0.7948784051 +050,4,8,56,007,Wyoming,Carbon County,15885,15884,15849,15842,15719,15849,15889,15630,15719,15261,14841,14832,14711,-35,-7,-123,130,40,-259,89,-458,-420,-9,-121,46,202,191,196,205,216,237,201,175,171,168,17,114,125,118,158,134,139,151,147,102,143,29,88,66,78,47,82,98,50,28,69,25,1,-8,1,6,-10,3,10,9,7,10,9,-70,-85,-192,48,5,-347,-19,-519,-457,-87,-155,-69,-93,-191,54,-5,-344,-9,-510,-450,-77,-146,5,-2,2,-2,-2,3,0,2,2,-1,0,780,777,780,780,799,787,806,807,791,677,752,752,12.748098829,12.103545515,12.417638115,12.918268322,13.706018592,15.120099525,12.976113622,11.62713441,11.52562936,11.373252547,7.1944716165,7.9211685308,7.4759249873,9.9565189993,8.5028078302,8.8679064723,9.7482246611,9.7667929041,6.8749368112,9.6808042514,5.5536272128,4.1823769843,4.9417131272,2.9617493226,5.2032107618,6.2521930524,3.2278889606,1.8603415055,4.6506925488,1.6924482957,-0.504875201,0.0633693482,0.380131779,-0.63015943,0.1903613693,0.6379788829,0.5810200129,0.4650853764,0.6740134129,0.6092813865,-5.364299012,-12.16691486,3.0410542321,0.3150797152,-22.01846505,-1.212159878,-33.50548741,-30.363431,-5.863916692,-10.49317943,-5.869174213,-12.10354552,3.4211860112,-0.315079715,-21.82810368,-0.574180995,-32.9244674,-29.89834562,-5.189903279,-9.883898047 +050,4,8,56,009,Wyoming,Converse County,13833,13833,13823,13739,14032,14369,14207,14303,14104,13756,13682,13865,13804,-10,-84,293,337,-162,96,-199,-348,-74,183,-61,56,163,192,177,198,217,185,166,152,162,161,39,99,132,127,118,132,129,126,120,110,126,17,64,60,50,80,85,56,40,32,52,35,1,-1,11,9,-3,16,7,16,16,7,4,-29,-147,214,273,-244,-5,-265,-407,-123,125,-100,-28,-148,225,282,-247,11,-258,-391,-107,132,-96,1,0,8,5,5,0,3,3,1,-1,0,103,103,103,103,103,103,103,103,103,103,103,103,11.827878964,13.827373879,12.464349847,13.857782755,15.222728867,13.024958637,11.91672649,11.079524747,11.761716339,11.637572735,7.1838037878,9.506319542,8.9433470652,8.2586786114,9.2599088039,9.082268455,9.0452261307,8.7469932211,7.9863506008,9.1076656186,4.644075176,4.3210543373,3.5210027816,5.5991041433,5.9628200631,3.942690182,2.8715003589,2.3325315256,3.7753657386,2.5299071163,-0.072563675,0.7921932952,0.6337805007,-0.209966405,1.1224131884,0.4928362727,1.1486001436,1.1662657628,0.508222311,0.2891322419,-10.66686017,15.41176047,19.224675187,-17.07726764,-0.350754121,-18.65737318,-29.21751615,-8.965668052,9.07539841,-7.228306046,-10.73942384,16.203953765,19.858455688,-17.28723404,0.771659067,-18.16453691,-28.06891601,-7.799402289,9.5836207209,-6.939173805 +050,4,8,56,011,Wyoming,Crook County,7083,7080,7119,7117,7137,7149,7237,7441,7497,7393,7452,7573,7593,39,-2,20,12,88,204,56,-104,59,121,20,36,80,100,87,100,116,99,101,116,108,104,20,64,54,77,56,62,56,62,72,53,73,16,16,46,10,44,54,43,39,44,55,31,3,2,6,0,3,24,19,7,7,2,2,20,-20,-32,3,41,126,-5,-150,9,65,-14,23,-18,-26,3,44,150,14,-143,16,67,-12,0,0,0,-1,0,0,-1,0,-1,-1,1,34,34,34,34,34,34,34,34,34,34,34,34,11.23911211,14.031149151,12.179756405,13.902405116,15.805968116,13.254786451,13.56615178,15.628157629,14.376039933,13.714888567,8.9912896881,7.5768205416,10.779784404,7.785346865,8.4480174411,7.4976569822,8.3277367361,9.7002357696,7.0549084859,9.6267967823,2.247822422,6.4543286095,1.3999720006,6.1170582511,7.3579506745,5.7571294685,5.2384150437,5.9279218592,7.3211314476,4.0880917843,0.2809778028,0.8418689491,0,0.4170721535,3.2702002998,2.5438479047,0.9402283412,0.9430784776,0.2662229617,0.263747857,-2.809778028,-4.489967728,0.4199916002,5.6999860976,17.168551574,-0.669433659,-20.14775017,1.2125294712,8.6522462562,-1.846234999,-2.528800225,-3.648098779,0.4199916002,6.1170582511,20.438751874,1.8744142455,-19.20752183,2.1556079488,8.918469218,-1.582487142 +050,4,8,56,013,Wyoming,Fremont County,40123,40123,40199,40525,41029,40937,40595,40261,40250,39865,39656,39467,39317,76,326,504,-92,-342,-334,-11,-385,-209,-189,-150,161,614,615,574,619,575,560,542,493,524,493,148,379,409,463,396,434,444,417,423,460,525,13,235,206,111,223,141,116,125,70,64,-32,5,-1,-1,21,-3,1,-5,-2,-3,-10,-5,59,94,288,-222,-575,-481,-120,-508,-277,-242,-113,64,93,287,-201,-578,-480,-125,-510,-280,-252,-118,-1,-2,11,-2,13,5,-2,0,1,-1,0,864,859,851,850,881,870,908,1034,1039,1032,1058,1059,15.212328428,15.082031537,14.005807286,15.184222146,14.22281587,13.911142577,13.530549835,12.399240452,13.245200511,12.515231519,9.3900203161,10.030164063,11.297367201,9.7139773341,10.735134065,11.029548757,10.410035574,10.638699212,11.627466097,13.327579204,5.8223081116,5.0518674743,2.7084400849,5.4702448119,3.4876818047,2.8815938195,3.1205142608,1.7605412407,1.6177344135,-0.812347685,-0.024775779,-0.024523629,0.5124075836,-0.073590737,0.0247353319,-0.12420663,-0.049928228,-0.075451767,-0.252771002,-0.126929326,2.3289232446,7.0628050126,-5.41688017,-14.10489133,-11.89769467,-2.980959124,-12.68176996,-6.966713195,-6.117058251,-2.868602762,2.3041474654,7.0382813841,-4.904472586,-14.17848207,-11.87295934,-3.105165754,-12.73169818,-7.042164963,-6.369829253,-2.995532088 +050,4,8,56,015,Wyoming,Goshen County,13249,13247,13425,13575,13647,13560,13541,13566,13329,13384,13334,13225,13235,178,150,72,-87,-19,25,-237,55,-50,-109,10,30,116,139,146,154,146,139,154,136,111,112,23,143,132,142,141,142,145,133,152,145,149,7,-27,7,4,13,4,-6,21,-16,-34,-37,3,-3,7,21,9,29,3,5,5,-1,2,150,180,59,-112,-43,-7,-234,30,-39,-74,45,153,177,66,-91,-34,22,-231,35,-34,-75,47,18,0,-1,0,2,-1,0,-1,0,0,0,1070,1165,1177,1198,1168,1158,1219,1206,1229,1239,1237,1239,8.5925925926,10.212328264,10.732532069,11.364894284,10.772125281,10.336493772,11.529966683,10.180402725,8.3587484469,8.4656084656,10.592592593,9.6980383513,10.438490094,10.405520092,10.476998561,10.782673359,9.9576984989,11.378097163,10.919085809,11.262282691,-2,0.5142899126,0.2940419745,0.9593741928,0.29512672,-0.446179587,1.572268184,-1.197694438,-2.560337362,-2.796674225,-0.222222222,0.5142899126,1.5437203661,0.6641821335,2.1396687203,0.2230897936,0.3743495676,0.3742795119,-0.07530404,0.1511715797,13.333333333,4.3347292631,-8.233175286,-3.173314638,-0.51647176,-17.4010039,2.2460974058,-2.919380193,-5.572498965,3.4013605442,13.111111111,4.8490191757,-6.68945492,-2.509132504,1.6231969602,-17.17791411,2.6204469734,-2.545100681,-5.647803005,3.552532124 +050,4,8,56,017,Wyoming,Hot Springs County,4812,4812,4809,4806,4834,4838,4795,4722,4664,4693,4554,4415,4425,-3,-3,28,4,-43,-73,-58,29,-139,-139,10,13,57,56,49,52,43,50,43,46,42,45,19,72,57,65,76,78,77,69,72,73,85,-6,-15,-1,-16,-24,-35,-27,-26,-26,-31,-40,4,-1,-2,-1,0,0,2,2,1,0,1,-1,14,31,21,-21,-37,-33,52,-112,-108,49,3,13,29,20,-21,-37,-31,54,-111,-108,50,0,-1,0,0,2,-1,0,1,-2,0,0,86,86,86,86,86,86,86,86,86,86,86,86,11.856474259,11.618257261,10.132340778,10.796221323,9.0364610697,10.654165779,9.190980015,9.9491727047,9.3655925967,10.180995475,14.976599064,11.825726141,13.440860215,15.779092702,16.39172008,16.407415299,14.748316768,15.572618146,16.278291894,19.230769231,-3.120124805,-0.20746888,-3.308519438,-4.98287138,-7.35525901,-5.753249521,-5.557336753,-5.623445442,-6.912699298,-9.049773756,-0.20800832,-0.414937759,-0.206782465,0,0,0.4261666312,0.4274874426,0.2162863631,0,0.2262443439,2.9121164847,6.4315352697,4.3424317618,-4.360012457,-7.775559525,-7.031749414,11.114673506,-24.22407267,-24.08295239,11.085972851,2.7041081643,6.0165975104,4.1356492969,-4.360012457,-7.775559525,-6.605582783,11.542160949,-24.00778631,-24.08295239,11.312217195 +050,4,8,56,019,Wyoming,Johnson County,8569,8569,8591,8650,8645,8648,8589,8622,8492,8457,8505,8548,8588,22,59,-5,3,-59,33,-130,-35,48,43,40,29,104,90,103,95,80,80,78,70,70,71,9,86,79,93,85,95,96,95,102,98,88,20,18,11,10,10,-15,-16,-17,-32,-28,-17,5,1,9,2,-2,3,1,0,0,0,0,-3,40,-23,-9,-67,46,-115,-18,81,70,56,2,41,-14,-7,-69,49,-114,-18,81,70,56,0,0,-2,0,0,-1,0,0,-1,1,1,71,71,71,71,71,71,71,71,71,71,71,71,12.064265414,10.407632264,11.912334471,11.022799791,9.296380222,9.3490709361,9.2040828367,8.2537436623,8.2096991732,8.2866479925,9.9762194768,9.1355883203,10.755797143,9.8625050763,11.039451514,11.218885123,11.210100891,12.026883622,11.493578842,10.270774977,2.088045937,1.2720439433,1.1565373272,1.1602947149,-1.743071292,-1.869814187,-2.006018054,-3.77313996,-3.283879669,-1.984126984,0.1160025521,1.0407632264,0.2313074654,-0.232058943,0.3486142583,0.1168633867,0,0,0,0,4.6401020822,-2.659728245,-1.040883595,-7.77397459,5.3454186276,-13.43928947,-2.124019116,9.5507605235,8.2096991732,6.5359477124,4.7561046343,-1.618965019,-0.809576129,-8.006033533,5.6940328859,-13.32242608,-2.124019116,9.5507605235,8.2096991732,6.5359477124 +050,4,8,56,021,Wyoming,Laramie County,91738,91885,92246,92610,94751,95786,96122,97090,98039,98599,99264,99865,100595,361,364,2141,1035,336,968,949,560,665,601,730,357,1288,1216,1250,1230,1312,1331,1285,1289,1205,1212,234,770,717,745,726,849,814,774,840,924,960,123,518,499,505,504,463,517,511,449,281,252,60,-30,222,110,15,191,44,93,55,-23,-6,168,-121,1358,423,-163,323,390,-38,163,342,480,228,-151,1580,533,-148,514,434,55,218,319,474,10,-3,62,-3,-20,-9,-2,-6,-2,1,4,1787,1785,1755,1931,1879,1960,1946,1950,2022,2082,2073,2076,13.93517116,12.980289388,13.120811181,12.818642266,13.580937002,13.642257173,13.069701685,13.029217186,12.10270729,12.092187968,8.3308088458,7.6536739236,7.8200034639,7.5661254351,8.7882740202,8.343198602,7.8723339334,8.4907233793,9.2804162126,9.5779706675,5.6043623145,5.3266154643,5.3008077171,5.252516831,4.7926629816,5.2990585715,5.1973677519,4.5384938063,2.8222910776,2.5142173002,-0.324576968,2.3697567797,1.1546313839,0.1563249057,1.9771028715,0.4509837082,0.9459005889,0.5559402213,-0.231006031,-0.059862317,-1.309127104,14.49607976,4.4400825037,-1.698730642,3.3434776308,3.9973555955,-0.386497015,1.6476046557,3.4349592475,4.7889853337,-1.633704072,16.86583654,5.5947138876,-1.542405736,5.3205805022,4.4483393037,0.5594035741,2.203544877,3.2039532163,4.7291230171 +050,4,8,56,023,Wyoming,Lincoln County,18106,18106,18098,18021,17957,18342,18601,18788,19141,19334,19537,19934,20253,-8,-77,-64,385,259,187,353,193,203,397,319,86,244,247,232,245,247,272,237,214,229,231,45,130,116,100,116,135,146,126,128,147,162,41,114,131,132,129,112,126,111,86,82,69,4,1,4,4,-10,7,4,8,7,0,3,-56,-192,-203,246,140,70,221,75,111,316,248,-52,-191,-199,250,130,77,225,83,118,316,251,3,0,4,3,0,-2,2,-1,-1,-1,-1,71,71,71,71,71,71,71,71,71,71,71,71,13.510894543,13.730613152,12.782721287,13.263676475,13.212442162,14.342587466,12.319688109,11.010779244,11.603455702,11.496255008,7.1984274205,6.4483851242,5.5097936582,6.2799447798,7.2213752708,7.6985947428,6.5497076023,6.5858866507,7.4485064984,8.0623087068,6.3124671226,7.2822280282,7.2729276289,6.9837316948,5.9910668913,6.6439927232,5.7699805068,4.4248925935,4.1549492032,3.433946301,0.0553725186,0.2223581077,0.2203917463,-0.54137455,0.3744416807,0.2109204039,0.4158544509,0.3601656762,0,0.1493020131,-10.63152357,-11.28467397,13.554092399,7.5792436998,3.7444168071,11.653352316,3.8986354776,5.7111985799,16.011755466,12.342299749,-10.57615106,-11.06231586,13.774484146,7.0378691498,4.1188584878,11.86427272,4.3144899285,6.0713642561,16.011755466,12.491601762 +050,4,8,56,025,Wyoming,Natrona County,75450,75448,75477,76431,78620,81175,81453,82218,81025,79622,79140,79734,80815,29,954,2189,2555,278,765,-1193,-1403,-482,594,1081,258,1033,1045,1137,1211,1180,1162,1033,980,933,931,186,665,650,711,701,733,737,722,710,751,804,72,368,395,426,510,447,425,311,270,182,127,26,-3,50,47,-30,101,80,64,61,21,19,-63,585,1676,2018,-190,225,-1706,-1790,-815,389,938,-37,582,1726,2065,-220,326,-1626,-1726,-754,410,957,-6,4,68,64,-12,-8,8,12,2,2,-3,1645,1645,1738,1718,1784,1723,1768,1721,1698,1670,1668,1668,13.600337046,13.479435799,14.230733127,14.892884374,14.419170165,14.236445054,12.860495372,12.345523488,11.745156539,11.597705373,8.7552992601,8.3843380565,8.8989017178,8.6209016897,8.956992992,9.0294836532,8.9886521379,8.9442057923,9.4540327555,10.015633856,4.845037786,5.095097742,5.331831409,6.2719826844,5.4621771725,5.2069614011,3.8718432339,3.4013176957,2.2911237836,1.5820715171,-0.039497591,0.6449490813,0.5882537001,-0.368940158,1.234183209,0.9801339108,0.7967780288,0.7684458498,0.2643604366,0.2366878648,7.7020301762,21.618693204,25.257360994,-2.336621,2.7494180398,-20.90135565,-22.28488549,-10.26694045,4.8969623727,11.684906166,7.6625325855,22.263642285,25.845614694,-2.705561158,3.9836012488,-19.92122174,-21.48810747,-9.498494602,5.1613228093,11.92159403 +050,4,8,56,027,Wyoming,Niobrara County,2484,2484,2491,2485,2480,2550,2494,2504,2470,2398,2403,2340,2275,7,-6,-5,70,-56,10,-34,-72,5,-63,-65,6,18,20,29,24,36,28,35,26,28,26,3,21,29,29,25,39,29,29,17,21,14,3,-3,-9,0,-1,-3,-1,6,9,7,12,0,0,0,0,0,0,0,0,0,0,0,4,-4,4,67,-56,13,-33,-78,-5,-69,-77,4,-4,4,67,-56,13,-33,-78,-5,-69,-77,0,1,0,3,1,0,0,0,1,-1,0,214,214,214,236,250,247,248,230,241,258,249,249,7.2347266881,8.0563947633,11.530815109,9.5162569389,14.405762305,11.258544431,14.379622021,10.831076859,11.806873287,11.267605634,8.4405144695,11.681772407,11.530815109,9.9127676447,15.606242497,11.660635304,11.914543961,7.0818579463,8.8551549652,6.0671722644,-1.205787781,-3.625377644,0,-0.396510706,-1.200480192,-0.402090873,2.4650780608,3.7492189127,2.9517183217,5.2004333694,0,0,0,0,0,0,0,0,0,0,-1.607717042,1.6112789527,26.640159046,-22.20459952,5.2020808323,-13.26899879,-32.04601479,-2.082899396,-29.09550917,-33.36944745,-1.607717042,1.6112789527,26.640159046,-22.20459952,5.2020808323,-13.26899879,-32.04601479,-2.082899396,-29.09550917,-33.36944745 +050,4,8,56,029,Wyoming,Park County,28205,28207,28243,28462,28829,29079,29000,28973,29262,29272,29309,29192,29331,36,219,367,250,-79,-27,289,10,37,-117,139,74,300,326,304,321,346,311,295,289,270,269,85,261,261,268,258,278,272,296,287,302,306,-11,39,65,36,63,68,39,-1,2,-32,-37,2,9,59,55,-9,-2,3,12,12,-1,0,45,172,238,157,-132,-91,248,0,25,-82,178,47,181,297,212,-141,-93,251,12,37,-83,178,0,-1,5,2,-1,-2,-1,-1,-2,-2,-2,942,942,864,916,862,866,792,832,761,650,547,547,10.581077506,11.380496064,10.499412862,11.05390933,11.936591172,10.680862025,10.07961185,9.866680323,9.2306114425,9.1929668677,9.2055374306,9.1113787506,9.2560613387,8.8844504899,9.5906715195,9.3414613205,10.113780025,9.7983987982,10.324609836,10.457426995,1.3755400758,2.2691173134,1.2433515231,2.1694588405,2.3459196523,1.339400704,-0.034168176,0.0682815247,-1.093998393,-1.264460127,0.3174323252,2.0596603306,1.899564827,-0.309922692,-0.068997637,0.1030308234,0.4100181091,0.4096891484,-0.03418745,0,6.066484437,8.3084603166,5.4223941424,-4.545532809,-3.139392476,8.5172147334,0,0.8535190591,-2.803370883,6.0830784478,6.3839167622,10.368120647,7.3219589694,-4.8554555,-3.208390113,8.6202455568,0.4100181091,1.2632082074,-2.837558332,6.0830784478 +050,4,8,56,031,Wyoming,Platte County,8667,8667,8665,8695,8729,8712,8778,8803,8673,8557,8571,8475,8578,-2,30,34,-17,66,25,-130,-116,14,-96,103,13,80,94,94,82,89,88,85,65,85,76,34,103,105,101,94,97,99,89,100,110,98,-21,-23,-11,-7,-12,-8,-11,-4,-35,-25,-22,0,-3,-1,6,-4,4,-4,-3,-3,-3,-1,18,57,48,-17,83,30,-114,-109,53,-69,127,18,54,47,-11,79,34,-118,-112,50,-72,126,1,-1,-2,1,-1,-1,-1,0,-1,1,-1,103,103,103,103,103,102,102,102,102,102,102,102,9.2165898618,10.789715335,10.77919844,9.3767867353,10.124566293,10.070954452,9.8665118979,7.5899112564,9.9730141969,8.9133876737,11.866359447,12.052341598,11.581904707,10.748999428,11.034639668,11.329823758,10.33081834,11.676786548,12.906253667,11.493578842,-2.649769585,-1.262626263,-0.802706267,-1.372212693,-0.910073375,-1.258869306,-0.464306442,-4.086875292,-2.93323947,-2.580191169,-0.34562212,-0.114784206,0.688033943,-0.457404231,0.4550366873,-0.457770657,-0.348229832,-0.350303596,-0.351988736,-0.117281417,6.5668202765,5.5096418733,-1.949429505,9.491137793,3.412775155,-13.04646372,-12.65235055,6.1886968706,-8.095740936,14.894739928,6.2211981567,5.3948576676,-1.261395562,9.033733562,3.8678118423,-13.50423438,-13.00058038,5.8383932742,-8.447729673,14.777458512 +050,4,8,56,033,Wyoming,Sheridan County,29116,29124,29148,29257,29538,29754,29884,29925,30027,30222,30277,30597,30863,24,109,281,216,130,41,102,195,55,320,266,87,341,332,305,362,331,335,324,293,298,293,85,298,286,291,295,330,321,340,337,326,352,2,43,46,14,67,1,14,-16,-44,-28,-59,27,14,38,42,2,13,21,38,28,57,45,-1,52,195,158,65,30,68,176,73,290,282,26,66,233,200,67,43,89,214,101,347,327,-4,0,2,2,-4,-3,-1,-3,-2,1,-2,1009,1009,997,987,1017,1019,1036,1005,1041,1038,1048,1049,11.677082442,11.293477337,10.288065844,12.139910795,11.068568276,11.175607152,10.755365234,9.6861105142,9.7907152479,9.5346566873,10.20460577,9.7287184284,9.8158267557,9.8930212281,11.035128492,10.708566853,11.286494382,11.140680011,10.710648224,11.454604621,1.4724766715,1.5647589081,0.4722390879,2.2468895671,0.0334397833,0.4670402989,-0.531129147,-1.454569497,-0.919932976,-1.919947934,0.4794110093,1.2926269241,1.4167172637,0.0670713304,0.434717183,0.7005604484,1.261431725,0.9256351345,1.8727207018,1.464367068,1.7806694632,6.6332171103,5.3295554206,2.1798182367,1.0031934993,2.2684814518,5.8424206211,2.4132630291,9.5278772547,9.1767002929,2.2600804726,7.9258440344,6.7462726843,2.2468895671,1.4379106823,2.9690419002,7.1038523461,3.3388981636,11.400597956,10.641067361 +050,4,8,56,035,Wyoming,Sublette County,10247,10244,10262,10194,10489,10190,10170,10064,9997,9778,9827,9867,9856,18,-68,295,-299,-20,-106,-67,-219,49,40,-11,33,134,137,132,126,144,109,101,104,72,77,3,53,38,48,57,47,60,49,59,70,75,30,81,99,84,69,97,49,52,45,2,2,12,4,6,8,-6,-8,-2,-1,-3,5,5,-26,-154,184,-405,-83,-199,-113,-271,6,33,-18,-14,-150,190,-397,-89,-207,-115,-272,3,38,-13,2,1,6,14,0,4,-1,1,1,0,0,550,550,550,550,550,550,550,550,550,550,550,550,13.101290575,13.247594643,12.766574786,12.377210216,14.233468419,10.866856089,10.214917826,10.609538383,7.311871636,7.8081427775,5.1818537348,3.6745153024,4.6423908313,5.5992141454,4.6456459425,5.9817556453,4.9557522124,6.0188727365,7.1087640906,7.6053338742,7.91943684,9.5730793405,8.1241839547,6.7779960707,9.587822477,4.8851004436,5.2591656131,4.5906656465,0.2031075454,0.2028089033,0.3910833007,0.5801866267,0.7737318052,-0.589390963,-0.790748246,-0.199391855,-0.1011378,-0.306044376,0.5077688636,0.5070222583,-15.05670708,17.792389885,-39.17017264,-8.15324165,-19.66986261,-11.2656398,-27.40834387,0.6120887529,3.3512744998,-1.82528013,-14.66562378,18.372576512,-38.39644083,-8.742632613,-20.46061085,-11.46503165,-27.50948167,0.3060443764,3.8590433635,-1.318257872 +050,4,8,56,037,Wyoming,Sweetwater County,43806,43806,43580,44000,45032,45189,44996,44780,44319,43663,43188,42917,42673,-226,420,1032,157,-193,-216,-461,-656,-475,-271,-244,166,636,593,653,629,642,626,571,529,481,481,75,249,273,296,263,260,303,312,331,301,319,91,387,320,357,366,382,323,259,198,180,162,4,-31,-16,79,-27,44,43,141,131,61,47,-344,65,702,-279,-548,-648,-831,-1062,-808,-511,-454,-340,34,686,-200,-575,-604,-788,-921,-677,-450,-407,23,-1,26,0,16,6,4,6,4,-1,1,679,679,694,697,731,671,682,680,660,627,807,807,14.523863896,13.321053105,14.475565556,13.949104618,14.302263411,14.051785093,12.979927712,12.181782593,11.172405784,11.239630798,5.6862297328,6.1326264714,6.5616652442,5.8324555081,5.7921939048,6.8014231361,7.0923598009,7.6222495999,6.9914639103,7.454141839,8.8376341631,7.1884266331,7.9139003115,8.1166491102,8.5100695063,7.2503619569,5.8875679116,4.5595329933,4.1809418733,3.785488959,-0.707924184,-0.359421332,1.751255251,-0.598769197,0.98021743,0.9652184649,3.2052010639,3.0166607178,1.4168747459,1.0982591424,1.4843571592,15.769610926,-6.184812848,-12.15279703,-14.43592942,-18.65340801,-24.14130163,-18.60657908,-11.86922943,-10.60871597,0.7764329756,15.410189595,-4.433557597,-12.75156622,-13.45571199,-17.68818954,-20.93610057,-15.58991837,-10.45235468,-9.510456829 +050,4,8,56,039,Wyoming,Teton County,21294,21298,21298,21422,21643,22335,22801,23083,23255,23383,23261,23385,23497,0,124,221,692,466,282,172,128,-122,124,112,76,261,234,261,246,264,245,244,255,211,225,10,87,61,97,79,92,97,78,72,90,124,66,174,173,164,167,172,148,166,183,121,101,1,-11,21,112,-24,76,57,67,60,23,18,-71,-39,29,400,310,36,-33,-103,-366,-19,-9,-70,-50,50,512,286,112,24,-36,-306,4,9,4,0,-2,16,13,-2,0,-2,1,-1,2,271,271,271,270,270,270,270,270,270,270,270,269,12.219101124,10.867293626,11.869571149,10.900389933,11.507279226,10.574474513,10.463570479,10.933882171,9.046863611,9.5985666141,4.0730337079,2.8329269709,4.4112965574,3.5005317263,4.0101124575,4.1866286849,3.3449118744,3.0872137896,3.8588517772,5.2898767117,8.1460674157,8.0343666551,7.4582745918,7.3998582063,7.4971667684,6.3878458285,7.1186586046,7.8466683818,5.1880118338,4.3086899023,-0.514981273,0.9752699408,5.0934558188,-1.063452676,3.3127015953,2.4601838664,2.8731935332,2.572678158,0.9861510097,0.7678853291,-1.825842697,1.3468013468,18.190913639,13.736263736,1.5691744399,-1.424316975,-4.416999014,-15.69333676,-0.814646486,-0.383942665,-2.34082397,2.3220712876,23.284369457,12.67281106,4.8818760352,1.0358668911,-1.543805481,-13.12065861,0.1715045234,0.3839426646 +050,4,8,56,041,Wyoming,Uinta County,21118,21121,21090,20901,21008,20969,20835,20777,20711,20449,20299,20196,20215,-31,-189,107,-39,-134,-58,-66,-262,-150,-103,19,71,323,310,316,319,305,312,272,267,232,232,49,139,115,136,148,150,143,151,130,156,171,22,184,195,180,171,155,169,121,137,76,61,-4,-18,-7,-11,-13,1,-4,6,6,-2,-2,-52,-358,-80,-212,-301,-217,-233,-390,-294,-177,-42,-56,-376,-87,-223,-314,-216,-237,-384,-288,-179,-44,3,3,-1,4,9,3,2,1,1,0,2,270,270,248,244,254,254,254,235,222,231,216,217,15.384249006,14.793958338,15.055863925,15.261697445,14.659232914,15.040493637,13.216715258,13.104937666,11.458204717,11.482022222,6.6204662904,5.488081319,6.4797389046,7.0806621376,7.20945881,6.8935595835,7.3372206025,6.3806812604,7.7046548957,8.463042241,8.7637827153,9.3058770193,8.5761250208,8.1810353076,7.4497741036,8.1469340532,5.879494655,6.7242564052,3.753549821,3.0189799807,-0.85732657,-0.334057124,-0.524096529,-0.621950053,0.0480630587,-0.192826841,0.2915451895,0.2944929813,-0.098777627,-0.09898295,-17.05127289,-3.8177957,-10.10076947,-14.40053583,-10.42968375,-11.23216352,-18.95043732,-14.43015608,-8.741819978,-2.078641954,-17.90859946,-4.151852824,-10.624866,-15.02248589,-10.38162069,-11.42499036,-18.65889213,-14.1356631,-8.840597605,-2.177624904 +050,4,8,56,043,Wyoming,Washakie County,8533,8528,8531,8451,8410,8417,8277,8282,8180,8013,7886,7824,7760,3,-80,-41,7,-140,5,-102,-167,-127,-62,-64,27,109,89,96,89,100,101,61,88,81,73,34,79,105,77,73,93,78,101,86,81,85,-7,30,-16,19,16,7,23,-40,2,0,-12,-1,-2,-1,-1,-2,-4,-5,-5,-7,-7,-3,11,-107,-25,-10,-157,4,-119,-125,-121,-53,-50,10,-109,-26,-11,-159,0,-124,-130,-128,-60,-53,0,-1,1,-1,3,-2,-1,3,-1,-2,1,140,140,140,140,140,140,140,140,140,140,140,140,12.837121658,10.556906471,11.410233553,10.662513478,12.078024035,12.270684,7.5341196813,11.069878609,10.311903246,9.3685831622,9.3039689083,12.454777297,9.1519581625,8.7456571223,11.232562353,9.4763698214,12.47452603,10.818290459,10.311903246,10.90862423,3.53315275,-1.897870826,2.2582753907,1.9168563556,0.8454616825,2.7943141781,-4.940406348,0.2515881502,0,-1.540041068,-0.235543517,-0.118616927,-0.1188566,-0.239607044,-0.483120961,-0.607459604,-0.617550794,-0.880558526,-0.891152132,-0.385010267,-12.60157814,-2.965423166,-1.188565995,-18.80915299,0.4831209614,-14.45753857,-15.43876984,-15.22108309,-6.747294717,-6.416837782,-12.83712166,-3.084040093,-1.307422595,-19.04876003,0,-15.06499818,-16.05632063,-16.10164161,-7.638446849,-6.801848049 +050,4,8,56,045,Wyoming,Weston County,7208,7208,7198,7142,7075,7132,7134,7202,7228,6962,6895,6880,6743,-10,-56,-67,57,2,68,26,-266,-67,-15,-137,25,79,72,95,74,72,89,58,67,53,53,9,71,67,81,75,68,69,69,68,67,72,16,8,5,14,-1,4,20,-11,-1,-14,-19,2,-1,5,9,3,43,15,19,17,3,2,-31,-62,-79,35,0,23,-8,-275,-85,-3,-119,-29,-63,-74,44,3,66,7,-256,-68,0,-117,3,-1,2,-1,0,-2,-1,1,2,-1,-1,313,313,313,313,322,317,327,319,332,315,313,313,11.018131102,10.128719139,13.373689027,10.374316557,10.044642857,12.335412335,8.1747709655,9.6702027856,7.6950998185,7.7809586728,9.9023709902,9.4253358655,11.402829591,10.514510024,9.4866071429,9.5634095634,9.7251585624,9.8145341705,9.7277676951,10.570358952,1.1157601116,0.7033832735,1.9708594355,-0.140193467,0.5580357143,2.772002772,-1.550387597,-0.144331385,-2.032667877,-2.789400279,-0.139470014,0.7033832735,1.2669810657,0.420580401,5.9988839286,2.079002079,2.6779422128,2.4536335426,0.4355716878,0.293621082,-8.647140865,-11.11345572,4.9271485887,0,3.2087053571,-1.108801109,-38.75968992,-12.26816771,-0.435571688,-17.47045438,-8.786610879,-10.41007245,6.1941296544,0.420580401,9.2075892857,0.9702009702,-36.08174771,-9.81453417,0,-17.1768333