diff --git a/R/gage_locations.R b/R/gage_locations.R index 2fa2a29..8543cdc 100644 --- a/R/gage_locations.R +++ b/R/gage_locations.R @@ -107,7 +107,8 @@ get_cdec_gage_locations <- function(gages) { nhdpv2_COMID = comid_medres, provider_id = id) |> mutate(nhdpv2_REACH_measure = rep(NA_real_, n()), - nhdpv2_COMID = as.numeric(nhdpv2_COMID)) + nhdpv2_COMID = as.numeric(nhdpv2_COMID), + nhdpv2_link_source = "https://cdec.water.ca.gov") } # gages <- targets::tar_read("co_gage") @@ -117,18 +118,22 @@ get_co_gage_locations <- function(gages) { select(provider_id = `DWR Abbrev`) |> mutate(nhdpv2_REACHCODE = rep(NA_character_, n()), nhdpv2_COMID = rep(NA_integer_, n()), - nhdpv2_REACH_measure = rep(NA_real_, n())) + nhdpv2_REACH_measure = rep(NA_real_, n()), + nhdpv2_link_source = rep(NA_character_, n())) } get_nwis_hydrolocations <- function(nhdpv2_gage, swim_gage, nwis_hydrolocation) { + nh <- read.csv(nwis_hydrolocation, colClasses = c("character", "integer", "character", "numeric")) + nh <- mutate(nh, nhdpv2_link_source = "https://github.com/internetofwater/ref_gages/blob/main/data/nwis_hydrolocations.csv") + if(any(swim_gage$Gage_no %in% nh$provider_id)) stop("duplicates in override registry") swim_gage <- sf::st_drop_geometry(swim_gage) |> @@ -136,12 +141,14 @@ get_nwis_hydrolocations <- function(nhdpv2_gage, nhdpv2_COMID = COMID, nhdpv2_REACHCODE = REACHCODE, nhdpv2_REACH_measure = REACH_meas) |> - filter(nhdpv2_COMID != -9999) + filter(nhdpv2_COMID != -9999) |> + mutate(nhdpv2_link_source = "https://doi.org/10.5066/P9J5CK2Y") nh <- bind_rows(nh, swim_gage) nhdpv2_gage <- filter(st_drop_geometry(nhdpv2_gage), - !provider_id %in% nh$provider_id) + !provider_id %in% nh$provider_id) |> + mutate(nhdpv2_link_source = "https://www.epa.gov/waterdata/nhdplus-national-hydrography-dataset-plus") bind_rows(nhdpv2_gage, nh) @@ -154,7 +161,7 @@ get_nwis_hydrolocations <- function(nhdpv2_gage, get_hydrologic_locations <- function(all_gages, ref_locations, hydrologic_locations, nhdpv2_fline, da_diff_thresh = 0.5, search_radius_m = 500, max_matches_in_radius = 5) { - + v2_area <- select(nhdplusTools::get_vaa(), nhdpv2_COMID = comid, nhdpv2_totdasqkm = totdasqkm) @@ -171,6 +178,8 @@ get_hydrologic_locations <- function(all_gages, ref_locations, hydrologic_locati all_gages$nhdpv2_REACHCODE <- NA all_gages$nhdpv2_REACH_measure <- NA all_gages$nhdpv2_COMID <- NA + all_gages$nhdpv2_link_source <- NA + all_gages$nhdpv2_offset_m <- NA for(hl in hydrologic_locations) { @@ -188,6 +197,8 @@ get_hydrologic_locations <- function(all_gages, ref_locations, hydrologic_locati hl$locations$nhdpv2_REACH_measure all_gages$nhdpv2_COMID[provider_selector][matcher] <- hl$locations$nhdpv2_COMID + all_gages$nhdpv2_link_source[provider_selector][matcher] <- + hl$locations$nhdpv2_link_source # Some gages missing reachcode/measure but have COMID update_index <- is.na(all_gages$nhdpv2_REACH_measure & !is.na(all_gages$nhdpv2_COMID)) @@ -204,13 +215,33 @@ get_hydrologic_locations <- function(all_gages, ref_locations, hydrologic_locati all_gages <- left_join(all_gages, v2_area, by = "nhdpv2_COMID") - diff_da <- abs(all_gages$nhdpv2_totdasqkm - - all_gages$drainage_area_sqkm) / + all_gages$da_diff <- all_gages$nhdpv2_totdasqkm - all_gages$drainage_area_sqkm + + norm_diff_da <- all_gages$da_diff / all_gages$drainage_area_sqkm - bad_da <- all_gages[!is.na(diff_da) & diff_da > da_diff_thresh, ] + abs_norm_diff_da <- abs(norm_diff_da) + + bad_da <- all_gages[!is.na(all_gages$da_diff) & # has an estimate + + ((all_gages$drainage_area_sqkm <= 100 & + # use unnormalized because differences so quantized + # due to catchment resolution. + # when da_diff is negative, use within 25% + (all_gages$da_diff > 10 | (all_gages$da_diff < 0 & abs_norm_diff_da > 0.25))) | + + # is something link ten or more catchments and within 10% + # drainage area threshold was selected based on distribution of catchment size. + (all_gages$drainage_area_sqkm > 100 & + abs_norm_diff_da > (0.1)) | + + # is something like a hundred or more catchments and within 5% + # drainage area threshold was selected based on distribution of catchment size. + (all_gages$drainage_area_sqkm > 500 & + abs_norm_diff_da > (0.05))), ] update_index <- which(is.na(all_gages$nhdpv2_COMID) | + !all_gages$nhdpv2_COMID %in% nhdpv2_fline$COMID | all_gages$provider_id %in% bad_da$provider_id) no_location <- all_gages[update_index, ] @@ -251,18 +282,51 @@ get_hydrologic_locations <- function(all_gages, ref_locations, hydrologic_locati linked_gages <- select(no_location, provider_id) |> mutate(id = seq_len(n())) |> left_join(select(linked_gages_dedup, - id, COMID, REACHCODE, REACH_meas), + id, COMID, REACHCODE, REACH_meas, nhdpv2_totdasqkm, offset), by = "id") all_gages$nhdpv2_REACHCODE[update_index] <- linked_gages$REACHCODE all_gages$nhdpv2_REACH_measure[update_index] <- linked_gages$REACH_meas all_gages$nhdpv2_COMID[update_index] <- linked_gages$COMID + all_gages$nhdpv2_totdasqkm[update_index] <- linked_gages$nhdpv2_totdasqkm + all_gages$nhdpv2_link_source[update_index] <- rep("https://github.com/internetofwater/ref_gages", nrow(linked_gages)) + all_gages$nhdpv2_offset_m[update_index] <- linked_gages$offset + + all_gages$nhdpv2_totdasqkm <- round(all_gages$nhdpv2_totdasqkm, digits = 1) + all_gages$drainage_area_sqkm <- round(all_gages$drainage_area_sqkm, digits = 1) + + all_gages$da_diff <- all_gages$nhdpv2_totdasqkm - all_gages$drainage_area_sqkm - all_gages + add_offset(all_gages, nhdpv2_fline) } -add_mainstems <- function(gage_hydrologic_locations, mainstems, vaa) { +add_offset <- function(all_gages, nhdpv2_fline) { + + missing_offset <- all_gages |> + filter(is.na(nhdpv2_offset_m) & !is.na(nhdpv2_REACHCODE)) + + missing_offset <- sf::st_transform(missing_offset, sf::st_crs(nhdpv2_fline)) + + new_indexes <- hydroloom::index_points_to_lines(nhdpv2_fline, sf::st_geometry(missing_offset), + search_radius = units::set_units(1000, "meters"), + ids = as.integer(missing_offset$nhdpv2_COMID)) + + missing_offset$point_id <- seq_len(nrow(missing_offset)) + + missing_offset <- left_join(missing_offset, new_indexes, by = "point_id") + + missing_offset$nhdpv2_offset_m <- missing_offset$offset + + missing_offset <- sf::st_transform(missing_offset, sf::st_crs(all_gages)) + + missing_offset[is.na(missing_offset$nhdpv2_offset_m), c('nhdpv2_REACHCODE', 'nhdpv2_REACH_measure','nhdpv2_COMID','nhdpv2_totdasqkm','nhdpv2_link_source')] <- NA + + dplyr::bind_rows(filter(all_gages, !id %in% missing_offset$id), + select(missing_offset, all_of(names(all_gages)))) +} +add_mainstems <- function(gage_hydrologic_locations, mainstems, vaa) { + mainstems <- mainstems[,c("head_nhdpv2_COMID", "uri"), drop = TRUE] mainstems$head_nhdpv2_COMID <- as.integer(gsub("https://geoconnex.us/nhdplusv2/comid/", "", mainstems$head_nhdpv2_COMID)) diff --git a/R/registry.R b/R/registry.R index 344fe53..c94aaf8 100644 --- a/R/registry.R +++ b/R/registry.R @@ -93,7 +93,10 @@ build_reference_location <- function(gl, reference_locations, registry, provider if(nrow(loc) == 0) return(existing_locations) # else return all the old plus some new - bind_rows(existing_locations, loc) + out <- bind_rows(existing_locations, loc) + write_csv(out, reference_locations) + + out } diff --git a/R/validation.R b/R/validation.R new file mode 100644 index 0000000..c9f2a4b --- /dev/null +++ b/R/validation.R @@ -0,0 +1,48 @@ +validate_ref_gage <- function(registry_csv, reference_file, + reference_locations_csv, + providers_lookup_csv, reference_out) { + + registry <- read_csv(registry_csv) + + reference <- read_sf(reference_file) + + ref_locations <- read_csv(reference_locations_csv) + + providers <- read_csv(providers_lookup_csv) + + if(any(!reference$id %in% registry$id)) { + stop("missing ids in registry") + } + + if(any(!reference$id %in% ref_locations$id)) { + stop("missing ids in ref locations") + } + + if(any(!reference$provider %in% providers$provider)) { + stop("missing providers") + } + + if(any(!registry$provider %in% providers$id)) { + stop("registry has unknown providers") + } + + if(any(sapply(names(registry), \(x) any(is.na(registry[[x]]))))) { + stop("NAs not allowed in registry") + } + + if(any(!is.na(reference$nhdpv2_COMID) & is.na(reference$nhdpv2_offset_m))) { + stop("if a comid is identified it must have an offset") + } + + if(any(!is.na(reference$nhdpv2_COMID) & is.na(reference$nhdpv2_REACH_measure))) { + stop("if a comid is identified it must have a measure") + } + + if(any(!is.na(reference$nhdpv2_COMID) & is.na(reference$nhdpv2_link_source))) { + stop("if a comid is identified it must have a link source") + } + + if(any(sf::st_is_empty(sf::st_geometry(reference)))) { + stop("all geometry must not be empty") + } +} \ No newline at end of file diff --git a/R/write_out.R b/R/write_out.R index 1ea81b7..b32b4bb 100644 --- a/R/write_out.R +++ b/R/write_out.R @@ -1,6 +1,6 @@ write_reference <- function(gage_hydrologic_locations, registry, providers, reference_file, nldi_file, duplicate_locations) { - + duplicate_locations$cluster_string <- unlist(lapply(duplicate_locations$cluster_id, \(x) { if(is.null(x)) return("") paste(paste0("https://geoconnex.us/ref/gages/", x), collapse = ",") @@ -18,13 +18,16 @@ write_reference <- function(gage_hydrologic_locations, registry, providers, refe distinct() if(any(duplicated(out$identifier))) stop("duplicate identifiers?") - + out <- out |> left_join(select(convert_provider_id(registry, providers), uri, identifier, id), by = "identifier") %>% select(id, uri, name, description, subjectOf, provider, provider_id, nhdpv2_REACHCODE, - nhdpv2_REACH_measure, nhdpv2_COMID, mainstem_uri) %>% + nhdpv2_REACH_measure, nhdpv2_COMID, nhdpv2_totdasqkm, + nhdpv2_link_source, nhdpv2_offset_m, + gage_totdasqkm = drainage_area_sqkm, + dasqkm_diff = da_diff, mainstem_uri) %>% mutate(id = as.integer(id)) |> left_join(dup, by = "uri") @@ -43,7 +46,8 @@ write_usgs_reference <- function(gage_hydrologic_locations, registry, providers, left_join(select(convert_provider_id(registry, providers), uri, identifier, id), by = "identifier") %>% filter(provider == "https://waterdata.usgs.gov") %>% - select(id, uri, name, description, subjectOf, provider, provider_id, nhdpv2_REACHCODE, nhdpv2_REACH_measure, nhdpv2_COMID) %>% + select(id, uri, name, description, subjectOf, provider, provider_id, + nhdpv2_REACHCODE, nhdpv2_REACH_measure, nhdpv2_COMID) %>% mutate(id = as.integer(id)) out$id <- out$provider_id diff --git a/_targets.R b/_targets.R index f2bd000..04f3fa8 100644 --- a/_targets.R +++ b/_targets.R @@ -2,11 +2,21 @@ library(targets) tar_option_set(packages = c("nhdplusTools", "sf", "dplyr", "dataRetrieval", "sbtools", "readr", "knitr", "mapview", "data.table"), - memory = "transient", garbage_collection = TRUE, - debug = "gage_hydrologic_locations_with_mainstems") + memory = "transient", garbage_collection = TRUE) +# primary output file for geoconnex reference server reference_file <- "out/ref_gages.gpkg" +# registry csv file which is checked in +registry_csv <- "reg/ref_gages.csv" + +# locations for all known reference gages +# https://github.com/internetofwater/ref_gages/issues/33 +reference_locations_csv <- "reg/ref_locations.csv" + +# contains information for each gage provider +providers_lookup_csv <- "reg/providers.csv" + # this is a set of location overrides nwis_hydrolocation <- "data/nwis_hydrolocations.csv" @@ -63,6 +73,8 @@ list( pnw_gage)), ### location normalization ### + # these targets generate a normalized form set of gages from each source. + # This Gage layer from NHDPlusV2 is a basic starting point for # NWIS gage locations. tar_target("nhdpv2_gage", select(read_sf(nat_db, "Gage"), @@ -84,19 +96,19 @@ list( # Each entry will have a provider and provider_id that acts as a unique # primary key. The existing registry file will have a unique attribute # that contains that primary key. - tar_target("providers_csv", command = "reg/providers.csv", format = "file"), + tar_target("providers_csv", providers_lookup_csv, format = "file"), tar_target("providers", read_csv(providers_csv)), tar_target("registry", build_registry(gage_locations, - registry = "reg/ref_gages.csv", + registry = registry_csv, providers = providers)), # Also create a table of reference locations for the registered gages. # unlike the registry, this may update to have the "best" location of a gage. tar_target("ref_locations", build_reference_location(gage_locations, - reference_locations = "reg/ref_locations.csv", - registry = "reg/ref_gages.csv", + reference_locations = reference_locations_csv, + registry = registry_csv, providers = providers)), ### spatial integration ### @@ -134,4 +146,9 @@ list( registry, providers, reference_file, nldi_file, duplicate_locations = duplicate_locations)), - tar_target("registry_out", write_registry(registry, "reg/ref_gages.csv"))) + tar_target("registry_out", write_registry(registry, registry_csv)), + + tar_target("validation", validate_ref_gage(registry_csv, reference_file, + reference_locations_csv, + providers_lookup_csv, + reference_out))) diff --git a/reg/ref_gages.csv b/reg/ref_gages.csv index c08432b..07fca30 100644 --- a/reg/ref_gages.csv +++ b/reg/ref_gages.csv @@ -192644,3 +192644,884 @@ id,provider,provider_id 1192657,1,491045115100801 1192658,1,493946114541801 1192659,1,502329114551701 +1192659,1,16891750 +1192660,1,16891780 +1192661,1,16891700 +1192662,1,320647110553500 +1192663,1,320750110562300 +1192664,1,320660110553500 +1192665,1,320713110555300 +1192666,1,16891500 +1192667,1,16890800 +1192668,1,06782600 +1192669,1,041275518 +1192670,1,06799850 +1192671,1,320704110543400 +1192672,1,02492323 +1192673,1,06810400 +1192674,1,06839700 +1192675,1,06806470 +1192676,1,16891200 +1192677,1,02476465 +1192678,1,0308595551 +1192679,1,03085955513 +1192680,1,03085955516 +1192681,1,03085955519 +1192682,1,0308595552 +1192683,1,0308595553 +1192684,1,88240606323 +1192685,1,88240606324 +1192686,1,0308595554 +1192687,1,16891310 +1192688,1,02476455 +1192689,1,16890650 +1192690,1,413918070490101 +1192691,1,16891420 +1192692,1,0308595558 +1192693,1,413844070464701 +1192694,1,06883540 +1192695,1,414231070453201 +1192696,1,06789100 +1192697,1,01398071 +1192698,1,0308595559 +1192699,1,16891400 +1192700,1,414211070451401 +1192701,1,422844071174701 +1192702,1,04183030 +1192703,1,06815510 +1192704,1,01398072 +1192705,1,01653560 +1192706,1,04127551 +1192707,1,01575504 +1192708,1,06810060 +1192709,1,01653620 +1192710,1,01571071 +1192711,1,041275505 +1192712,1,02476486 +1192713,1,0308595548 +1192714,1,01398073 +1192715,1,01479775 +1192716,1,16891300 +1192717,1,88240606303 +1192718,1,88240606306 +1192719,1,88240606307 +1192720,1,88240606308 +1192721,1,88240606309 +1192722,1,02492314 +1192723,1,414122070444901 +1192724,1,414102070441801 +1192725,1,414044070440401 +1192726,1,414059070433501 +1192727,1,030850498 +1192728,1,16890900 +1192729,1,414035070443001 +1192730,1,030859556 +1192731,1,16890700 +1192732,1,11023100 +1192733,1,06610700 +1192734,1,01362358 +1192735,1,02476460 +1192736,1,06767100 +1192737,1,041275689 +1192738,1,01573816 +1192739,1,11022830 +1192740,1,01571102 +1192741,1,016141305 +1192742,1,01123745 +1192743,1,07277900 +1192744,1,01487165 +1192745,1,01480777 +1192746,1,015319015 +1192747,1,06837100 +1192748,1,06767300 +1192749,1,01569315 +1192750,1,01571080 +1192751,1,06799423 +1192752,1,06810300 +1192753,1,320703110553400 +1192754,1,320704110553600 +1192755,1,09482375 +1192756,1,09482385 +1192757,1,02174140 +1192758,1,320742110563100 +1192759,1,06849600 +1192760,1,09482390 +1192761,1,320805110571800 +1192762,1,413858070483201 +1192763,1,413846070480601 +1192764,1,14150250 +1192765,1,413813070474301 +1192766,1,413824070470401 +1192767,1,423302071132001 +1192768,1,06767400 +1192769,1,01576706 +1192770,1,04026590 +1192771,1,021305805 +1192772,1,01123365 +1192773,1,02169590 +1192774,1,0215329875 +1192775,1,0217203505 +1192776,1,02157530 +1192777,1,0217252503 +1192778,1,06806460 +1192779,1,06767410 +1192780,1,07029414 +1192781,1,04164151 +1192782,1,11046325 +1192783,1,01123620 +1192784,1,021474750 +1192785,1,14144780 +1192786,1,14147200 +1192787,1,14306950 +1192788,1,09537700 +1192789,1,0217689150 +1192790,1,08181447 +1192791,1,08181460 +1192792,1,14307605 +1192793,1,14039320 +1192794,1,14322810 +1192795,1,14190610 +1192796,1,05429510 +1192797,1,470043113225701 +1192798,1,470020113224901 +1192799,1,09313520 +1192800,1,14078250 +1192801,1,14078260 +1192802,1,01019997 +1192803,1,14312330 +1192804,1,03012545 +1192805,1,03311513 +1192806,1,01444802 +1192807,1,02419870 +1192808,1,03587320 +1192809,1,03590945 +1192810,1,15564880 +1192811,1,09482374 +1192812,1,09482386 +1192813,1,320658110553700 +1192814,1,320704110553500 +1192815,1,320707110554400 +1192816,1,320717110573700 +1192817,1,320720110560400 +1192818,1,320729110561800 +1192819,1,320730110573700 +1192820,1,320733110562100 +1192821,1,373306119411401 +1192822,1,374009119490301 +1192823,1,374244119333801 +1192824,1,374254119395401 +1192825,1,374333119314901 +1192826,1,374345119333301 +1192827,1,374422119500501 +1192828,1,374435119353501 +1192829,1,374437119335901 +1192830,1,374453119354601 +1192831,1,375245119180901 +1192832,1,375555119353901 +1192833,1,375708121194001 +1192834,1,375712121185101 +1192835,1,375718119430301 +1192836,1,375719119424901 +1192837,1,375722121173601 +1192838,1,380341121551901 +1192839,1,380406122000001 +1192840,1,380421121562101 +1192841,1,381124122012301 +1192842,1,381257122020501 +1192843,1,381314122015401 +1192844,1,381314122023801 +1192845,1,381335122012501 +1192846,1,381427121305401 +1192847,1,381435121410201 +1192848,1,381717121393201 +1192849,1,381738121413101 +1192850,1,381920121413501 +1192851,1,381945121484901 +1192852,1,384101121404201 +1192853,1,385601120004401 +1192854,1,385623120010201 +1192855,1,385628120033001 +1192856,1,385630120000401 +1192857,1,385633120032701 +1192858,1,385641120010101 +1192859,1,385648120032001 +1192860,1,385700120000501 +1192861,1,385703120000501 +1192862,1,391008120083002 +1192863,1,403748122283202 +1192864,1,403749122283401 +1192865,1,09085160 +1192866,1,384522104433101 +1192867,1,390442106203001 +1192868,1,391202106211501 +1192869,1,391208106211101 +1192870,1,391208106211601 +1192871,1,391210106212201 +1192872,1,391215106212901 +1192873,1,391240106223801 +1192874,1,391320106224501 +1192875,1,391322106225001 +1192876,1,391323106224401 +1192877,1,391407106225401 +1192878,1,391427106225601 +1192879,1,391429106225701 +1192880,1,391430106225501 +1192881,1,391431106225401 +1192882,1,391433106225401 +1192883,1,391434106225101 +1192884,1,391435106225001 +1192885,1,391436106225001 +1192886,1,391436106225101 +1192887,1,391439106224901 +1192888,1,391443106224701 +1192889,1,391444106224701 +1192890,1,391445106224501 +1192891,1,391449106224201 +1192892,1,391453106224101 +1192893,1,391454106223901 +1192894,1,391454106223902 +1192895,1,391454106224001 +1192896,1,391454106224101 +1192897,1,391455106223901 +1192898,1,391456106223801 +1192899,1,391456106223901 +1192900,1,391457106223701 +1192901,1,391458106223701 +1192902,1,391458106223801 +1192903,1,391458106223802 +1192904,1,391459106223801 +1192905,1,391459106224401 +1192906,1,391459106224501 +1192907,1,391459106224502 +1192908,1,391459106224503 +1192909,1,391500106223601 +1192910,1,391500106223701 +1192911,1,391500106224401 +1192912,1,391501106223601 +1192913,1,391502106223501 +1192914,1,391504106223201 +1192915,1,393832106210401 +1192916,1,400341105302901 +1192917,1,400352105304301 +1192918,1,01477405 +1192919,1,01478005 +1192920,1,01481340 +1192921,1,014847175 +1192922,1,383234075045201 +1192923,1,383309075051101 +1192924,1,01651760 +1192925,1,02232900 +1192926,1,02261400 +1192927,1,02262499 +1192928,1,02272701 +1192929,1,02272702 +1192930,1,02291195 +1192931,1,02299729 +1192932,1,02310667 +1192933,1,02310687 +1192934,1,02313097 +1192935,1,252653080273001 +1192936,1,252654080220201 +1192937,1,253256080205103 +1192938,1,254016080170201 +1192939,1,254838080155301 +1192940,1,254929080170101 +1192941,1,255242080110901 +1192942,1,200132155395601 +1192943,1,882024060600320 +1192944,1,88240606311 +1192945,1,12413795 +1192946,1,13310875 +1192947,1,13338275 +1192948,1,13338745 +1192949,1,13338775 +1192950,1,13338945 +1192951,1,13340785 +1192952,1,13341135 +1192953,1,13341305 +1192954,1,13341310 +1192955,1,13341975 +1192956,1,05568703 +1192957,1,05578330 +1192958,1,05578360 +1192959,1,404721091043701 +1192960,1,412341088161001 +1192961,1,412943087322601 +1192962,1,412948087322501 +1192963,1,412948087323401 +1192964,1,412952087453701 +1192965,1,413015087322801 +1192966,1,413135087350901 +1192967,1,413541087445201 +1192968,1,413613087520901 +1192969,1,413846087340101 +1192970,1,413924087335501 +1192971,1,414004087551801 +1192972,1,414044087334501 +1192973,1,414101087313701 +1192974,1,414106087595601 +1192975,1,414123087540101 +1192976,1,414128087345701 +1192977,1,414222087553301 +1192978,1,414310087543801 +1192979,1,414908087484901 +1192980,1,415334087493801 +1192981,1,415724087502301 +1192982,1,420033088055001 +1192983,1,420045088092001 +1192984,1,420141088060901 +1192985,1,420201088094101 +1192986,1,420203088135701 +1192987,1,420242088074501 +1192988,1,420254088080101 +1192989,1,420321088084801 +1192990,1,420413088052301 +1192991,1,420417088063301 +1192992,1,420441088036001 +1192993,1,420450088054201 +1192994,1,420453088121901 +1192995,1,420460088093801 +1192996,1,420510088124101 +1192997,1,420516088041001 +1192998,1,420519088093801 +1192999,1,420522088130601 +1193000,1,420533087481001 +1193001,1,420548088122601 +1193002,1,420643088033701 +1193003,1,420645088074701 +1193004,1,420647088032501 +1193005,1,420657087532101 +1193006,1,420709088094801 +1193007,1,420718087462201 +1193008,1,420729087464001 +1193009,1,420736088032401 +1193010,1,420737088023001 +1193011,1,420756088115301 +1193012,1,420811088062501 +1193013,1,420830087471401 +1193014,1,420837087471601 +1193015,1,420840087540901 +1193016,1,420842087472401 +1193017,1,420845087471201 +1193018,1,420846087471901 +1193019,1,420848087473201 +1193020,1,420852087471101 +1193021,1,420859087473001 +1193022,1,384739094421200 +1193023,1,384755094411500 +1193024,1,384931094432100 +1193025,1,385239094430100 +1193026,1,385312094402000 +1193027,1,385357094391700 +1193028,1,385500094422600 +1193029,1,385559094431000 +1193030,1,390024094374800 +1193031,1,391419097001500 +1193032,1,391503096594500 +1193033,1,391529097003300 +1193034,1,07369860 +1193035,1,07373210 +1193036,1,07373285 +1193037,1,08012450 +1193038,1,01640152 +1193039,1,882024060600312 +1193040,1,01107600 +1193041,1,412116070433001 +1193042,1,412238070403701 +1193043,1,412321070401701 +1193044,1,412348070421801 +1193045,1,412407070403901 +1193046,1,412630070400301 +1193047,1,414851070565701 +1193048,1,414945070560301 +1193049,1,415026070563603 +1193050,1,422734071164301 +1193051,1,422800071163702 +1193052,1,422805071130000 +1193053,1,422832071154701 +1193054,1,422858071171301 +1193055,1,422953071152201 +1193056,1,423223070531001 +1193057,1,040967671 +1193058,1,04101792 +1193059,1,041027918 +1193060,1,04108895 +1193061,1,04108896 +1193062,1,041088962 +1193063,1,04108897 +1193064,1,041088976 +1193065,1,041088978 +1193066,1,041088987 +1193067,1,04120196 +1193068,1,04154114 +1193069,1,04154120 +1193070,1,04160062 +1193071,1,041600633 +1193072,1,04165701 +1193073,1,421337083074201 +1193074,1,483142092465201 +1193075,1,02487630 +1193076,1,380220094312200 +1193077,1,385506094342300 +1193078,1,385632094340000 +1193079,1,385714094340800 +1193080,1,385749094332500 +1193081,1,385841094322100 +1193082,1,385952094311700 +1193083,1,390443094301200 +1193084,1,402217094473201 +1193085,1,06096001 +1193086,1,06154428 +1193087,1,06192978 +1193088,1,06666667 +1193089,1,463938111393901 +1193090,1,463943111414901 +1193091,1,470016113224701 +1193092,1,470024113224901 +1193093,1,470024113225001 +1193094,1,470026113224901 +1193095,1,470036113224901 +1193096,1,470040113225301 +1193097,1,470403113231801 +1193098,1,470415113230401 +1193099,1,470419113231101 +1193100,1,470424113230501 +1193101,1,470425113231901 +1193102,1,470612113244801 +1193103,1,471030113291901 +1193104,1,471123113310401 +1193105,1,471127113305801 +1193106,1,471217113311201 +1193107,1,471245113311501 +1193108,1,471250113312701 +1193109,1,471250113312801 +1193110,1,471251113312701 +1193111,1,471834113345401 +1193112,1,471858113350001 +1193113,1,471921113352001 +1193114,1,471925113352101 +1193115,1,471926113350901 +1193116,1,471927113351401 +1193117,1,475209115243401 +1193118,1,475210115233901 +1193119,1,475210115244201 +1193120,1,475210115250401 +1193121,1,475211115251001 +1193122,1,475212115233301 +1193123,1,475230115222001 +1193124,1,475232115221501 +1193125,1,475822115253601 +1193126,1,475827115251601 +1193127,1,06767970 +1193128,1,410556095543101 +1193129,1,411401096274801 +1193130,1,364105114165601 +1193131,1,364359114131601 +1193132,1,364742114041301 +1193133,1,364742114042201 +1193134,1,383145118485501 +1193135,1,385835119570501 +1193136,1,385835119570701 +1193137,1,390518119562401 +1193138,1,391418119564507 +1193139,1,392901118453901 +1193140,1,392923118390101 +1193141,1,392927118361101 +1193142,1,393014118382801 +1193143,1,393201118372201 +1193144,1,393243118355501 +1193145,1,400136115445001 +1193146,1,401046115460501 +1193147,1,401048115451301 +1193148,1,402517115422601 +1193149,1,402759115423801 +1193150,1,403016115434401 +1193151,1,403019115432301 +1193152,1,403042115552001 +1193153,1,403148115430001 +1193154,1,403704115434501 +1193155,1,403721115433501 +1193156,1,403746115514601 +1193157,1,404058115503901 +1193158,1,404102116091001 +1193159,1,404104115502701 +1193160,1,404109115472301 +1193161,1,404251116003601 +1193162,1,404408115500201 +1193163,1,404440115505301 +1193164,1,404446115510901 +1193165,1,404620115531601 +1193166,1,404642115510401 +1193167,1,404906115471901 +1193168,1,405002115450101 +1193169,1,405239115420201 +1193170,1,405534115304001 +1193171,1,411326115461701 +1193172,1,411327115462201 +1193173,1,411442115450501 +1193174,1,411452115442601 +1193175,1,411529115440501 +1193176,1,411803115420501 +1193177,1,411803115420701 +1193178,1,411816115463101 +1193179,1,411853115364201 +1193180,1,411901115313601 +1193181,1,412015115345001 +1193182,1,07214550 +1193183,1,07214585 +1193184,1,07214695 +1193185,1,07214790 +1193186,1,07218475 +1193187,1,07218525 +1193188,1,07218615 +1193189,1,07218635 +1193190,1,07218655 +1193191,1,07218680 +1193192,1,07218720 +1193193,1,08379189 +1193194,1,08386470 +1193195,1,08386500 +1193196,1,08386809 +1193197,1,08386850 +1193198,1,08387700 +1193199,1,08387710 +1193200,1,08389030 +1193201,1,08390025 +1193202,1,09442540 +1193203,1,330203108111710 +1193204,1,330442108292210 +1193205,1,331926105391610 +1193206,1,331927105391410 +1193207,1,331928105391910 +1193208,1,332105105403110 +1193209,1,332145105411510 +1193210,1,332554105275810 +1193211,1,333112107063010 +1193212,1,333235107061010 +1193213,1,352228104124130 +1193214,1,360734105303710 +1193215,1,363536105290410 +1193216,1,363550105265110 +1193217,1,01297000 +1193218,1,404556073582601 +1193219,1,404635073582201 +1193220,1,404644073581801 +1193221,1,404646073580401 +1193222,1,404648073580601 +1193223,1,404709073574301 +1193224,1,404741073573801 +1193225,1,404746073570401 +1193226,1,425603078533401 +1193227,1,425605078524101 +1193228,1,425615078531601 +1193229,1,425616078530201 +1193230,1,425616078530901 +1193231,1,425908078535601 +1193232,1,430000078540901 +1193233,1,430012078541701 +1193234,1,430020078542201 +1193235,1,430032078542401 +1193236,1,430046078505001 +1193237,1,430050078520101 +1193238,1,430101078521501 +1193239,1,430102078495701 +1193240,1,430128078492601 +1193241,1,430441078574101 +1193242,1,430451078573601 +1193243,1,430454078573701 +1193244,1,430500079013001 +1193245,1,430504078574501 +1193246,1,430515078574501 +1193247,1,430517078574501 +1193248,1,430522078565901 +1193249,1,430525078564201 +1193250,1,430530078574401 +1193251,1,430536078561801 +1193252,1,430536078575301 +1193253,1,430540079012501 +1193254,1,430541078575301 +1193255,1,430542078560901 +1193256,1,430545078560101 +1193257,1,430552078575701 +1193258,1,430554078560101 +1193259,1,430555078553501 +1193260,1,430558078552401 +1193261,1,430560078551801 +1193262,1,430639079005501 +1193263,1,430649079004301 +1193264,1,430703078553201 +1193265,1,0208725090 +1193266,1,02103770 +1193267,1,412539082565000 +1193268,1,412556082553300 +1193269,1,412611083002600 +1193270,1,412613082541800 +1193271,1,412635082571000 +1193272,1,412638082530600 +1193273,1,412647082514700 +1193274,1,412652082555600 +1193275,1,412652083014100 +1193276,1,412703082460400 +1193277,1,412706083000300 +1193278,1,412709082543900 +1193279,1,412710082450600 +1193280,1,412711082503600 +1193281,1,412722083013600 +1193282,1,412723082585000 +1193283,1,412724082532100 +1193284,1,412732082495200 +1193285,1,412734082573600 +1193286,1,412738082443800 +1193287,1,412741083003200 +1193288,1,412742082520800 +1193289,1,412749082464200 +1193290,1,412751082561500 +1193291,1,412752082423800 +1193292,1,412754082411200 +1193293,1,412757082590000 +1193294,1,412758082473500 +1193295,1,412758082505300 +1193296,1,412804082452300 +1193297,1,412808082550200 +1193298,1,412820082440500 +1193299,1,412824082534400 +1193300,1,412828082574100 +1193301,1,412833082425300 +1193302,1,412833082481900 +1193303,1,412834082492400 +1193304,1,412836082414400 +1193305,1,412841082522900 +1193306,1,412846082470200 +1193307,1,412848082564000 +1193308,1,412856082494500 +1193309,1,412856082511500 +1193310,1,412857082552400 +1193311,1,412902082454700 +1193312,1,412902082541200 +1193313,1,412914082524600 +1193314,1,412917082443100 +1193315,1,412925082484100 +1193316,1,412935082431700 +1193317,1,412935082512900 +1193318,1,412942082472300 +1193319,1,412951082415700 +1193320,1,412951082503000 +1193321,1,412955082460800 +1193322,1,413014082445100 +1193323,1,413029082433800 +1193324,1,413049082422600 +1193325,1,07164480 +1193326,1,07332335 +1193327,1,07332340 +1193328,1,13318960 +1193329,1,14012391 +1193330,1,14012392 +1193331,1,14012393 +1193332,1,14144790 +1193333,1,14206339 +1193334,1,142063391 +1193335,1,142063398 +1193336,1,14206956 +1193337,1,14300350 +1193338,1,420024121132800 +1193339,1,423655121205000 +1193340,1,423820121522500 +1193341,1,423841121211400 +1193342,1,423949121504700 +1193343,1,424041121500500 +1193344,1,424042121500700 +1193345,1,424140121161300 +1193346,1,424143121162500 +1193347,1,424324121494200 +1193348,1,424623121453700 +1193349,1,424859121385800 +1193350,1,424926121395100 +1193351,1,425047123225600 +1193352,1,425055123225600 +1193353,1,425105121091200 +1193354,1,425118123234900 +1193355,1,425125123230600 +1193356,1,425306121353400 +1193357,1,425326121322100 +1193358,1,425338121313800 +1193359,1,425537121083800 +1193360,1,425626121275000 +1193361,1,425657121130700 +1193362,1,425702121264800 +1193363,1,425705121270100 +1193364,1,425818118520500 +1193365,1,425839121145500 +1193366,1,425906121152700 +1193367,1,430005121224300 +1193368,1,430007121180000 +1193369,1,430242118502100 +1193370,1,430351121291000 +1193371,1,430543121325800 +1193372,1,430649121304300 +1193373,1,431254121341300 +1193374,1,431528121365100 +1193375,1,431605118510600 +1193376,1,431702121391800 +1193377,1,431731121373400 +1193378,1,432148121353100 +1193379,1,443016122095400 +1193380,1,450822122320300 +1193381,1,451422122422700 +1193382,1,02136371 +1193383,1,02171920 +1193384,1,021721675 +1193385,1,02175090 +1193386,1,02175310 +1193387,1,325555080420800 +1193388,1,340330079555000 +1193389,1,342346079261500 +1193390,1,440449103162801 +1193391,1,440449103162901 +1193392,1,440450103162901 +1193393,1,03544600 +1193394,1,03544611 +1193395,1,07346051 +1193396,1,08021599 +1193397,1,08042521 +1193398,1,08048508 +1193399,1,08065900 +1193400,1,08066143 +1193401,1,08163480 +1193402,1,08181482 +1193403,1,334132096002201 +1193404,1,10141450 +1193405,1,390450110083501 +1193406,1,415955111212401 +1193407,1,434928072192701 +1193408,1,0162932568 +1193409,1,0163382274 +1193410,1,0163382343 +1193411,1,360634077541201 +1193412,1,380603077495801 +1193413,1,380606077495501 +1193414,1,380606077495601 +1193415,1,380606077495602 +1193416,1,380606077495603 +1193417,1,380606077495604 +1193418,1,380606077495605 +1193419,1,380641077534701 +1193420,1,380642077534701 +1193421,1,380642077534702 +1193422,1,380642077534703 +1193423,1,380642077534704 +1193424,1,380642077534801 +1193425,1,380756077523801 +1193426,1,380756077523901 +1193427,1,380756077523902 +1193428,1,380756077523903 +1193429,1,380756077523904 +1193430,1,380756077523905 +1193431,1,380809077531901 +1193432,1,12039215 +1193433,1,1203950340 +1193434,1,1203950360 +1193435,1,1203950780 +1193436,1,12039870 +1193437,1,12039890 +1193438,1,12072790 +1193439,1,12097855 +1193440,1,12097865 +1193441,1,12097875 +1193442,1,12097880 +1193443,1,12098525 +1193444,1,12098590 +1193445,1,12112544 +1193446,1,12113445 +1193447,1,12119995 +1193448,1,12126050 +1193449,1,12127475 +1193450,1,12128495 +1193451,1,12132900 +1193452,1,12181900 +1193453,1,12181950 +1193454,1,1247351985 +1193455,1,12512020 +1193456,1,12514450 +1193457,1,12514800 +1193458,1,14243550 +1193459,1,14244100 +1193460,1,14244180 +1193461,1,462025118994781 +1193462,1,462192119145446 +1193463,1,462235119112763 +1193464,1,464019120264300 +1193465,1,464044120264000 +1193466,1,464056120265900 +1193467,1,471515122262600 +1193468,1,472240122125960 +1193469,1,473321122390599 +1193470,1,473322122390556 +1193471,1,473322122390561 +1193472,1,473322122390578 +1193473,1,473322122390593 +1193474,1,473322122390634 +1193475,1,473322122390652 +1193476,1,473323122390659 +1193477,1,04026449 +1193478,1,04026586 +1193479,1,04027529 +1193480,1,040872343 +1193481,1,04087262 +1193482,1,05390350 +1193483,1,05390990 +1193484,1,424827088241601 +1193485,1,430532089315402 +1193486,1,454715092182601 +1193487,1,463101091353901 +1193488,1,463101091361201 +1193489,1,463301091352001 +1193490,1,463443091370001 +1193491,1,463823091341601 +1193492,1,464032091345601 +1193493,1,464109091554701 +1193494,1,464146091505901 +1193495,1,464200091470001 +1193496,1,464246091355901 +1193497,1,464307091360701 +1193498,1,464307091432601 +1193499,1,464352091402101 +1193500,1,464451091363601 +1193501,1,464455091370501 +1193502,1,464533091341701 +1193503,1,464616091290201 +1193504,1,464650091083001 +1193505,1,464747091071401 +1193506,1,464748091221401 +1193507,1,464755091035901 +1193508,1,464759091040601 +1193509,1,464813091055001 +1193510,1,464837091040401 +1193511,1,464903091042001 +1193512,1,464958091173901 +1193513,1,465016091155301 +1193514,1,465102091112501 +1193515,1,465133091065501 +1193516,1,465203091134101 +1193517,1,465250091034101 +1193518,1,8801234501201 +1193519,1,88240606302 +1193520,1,88240606310 +1193521,1,88240606325 +1193522,1,88240606328 +1193523,1,16890850 +1193524,1,16891425 +1193525,1,16891770 +1193526,1,50111315 +1193527,1,480233089354001 +1193528,1,480327089351901 +1193529,1,480806089323901 +1193530,1,492728088313501 +1193531,1,493202089010401 +1193532,1,494551094332301 +1193533,1,494559094303801 +1193534,1,494610094295701 +1193535,1,494638094312701 +1193536,1,494856089043701 +1193537,1,495738088011001 +1193538,1,500109088545501 +1193539,1,500616088095901 diff --git a/reg/ref_locations.csv b/reg/ref_locations.csv index 979bab9..743ab65 100644 --- a/reg/ref_locations.csv +++ b/reg/ref_locations.csv @@ -191114,3 +191114,2408 @@ id,provider,provider_id,lon,lat 1191129,3,BCACOACO,-106.072541,38.691887 1191130,3,MCGDITCO,-105.220581,39.981162 1191131,3,0900535A,-105.193334,39.620591 +1191132,3,0802901A,-105.017539,39.644285000000004 +1191142,3,0900955A,-105.431934,39.624751 +1191143,3,0903343A,-105.430247,39.625082 +1191133,3,0903989A,-105.090904,39.615283 +1191134,3,0903994A,-105.067086,39.610127 +1191144,3,1403593C,-104.411074,38.260386 +1191145,3,2000682A,-106.344914,37.668702 +1191146,3,8000656A,-105.605099,39.442427 +1191135,3,ARKHOLCO,-102.119637,38.043626 +1191147,3,BARRESCO,-105.491794,39.965111 +1191148,3,BOCYPLCO,-105.500075,39.991078 +1191149,3,CHPUMPCO,-105.086127,39.530435 +1191136,3,CLASRKCO,-105.51286,40.62813 +1191150,3,COCABCCO,-105.058065,40.076707999999996 +1191151,3,CSMOUTCO,-107.751657,38.960401 +1191152,3,CULCHACO,-105.32113,37.181413 +1191137,3,DLFDT2CO,-106.998853,37.56749 +1191138,3,HERHERCO,-107.845083,37.421951 +1191153,3,HOWRTNCO,-105.220475,39.988551 +1191139,3,JACO10CO,-108.262085,37.383185 +1191154,3,LAJOUTCO,-106.339732,37.244065 +1191155,3,LEVRESCO,-105.200945,40.018895 +1191156,3,MCARTHCO,-105.53784,39.403678 +1191157,3,METPUMCO,-104.951056,39.809771 +1191158,3,PLAMERCO,-103.345742,40.473863 +1191159,3,PLATAMCO,-102.690144,40.870107 +1191160,3,SANSANCO,-105.373563,37.430539 +1191161,3,SILLAKCO,-105.577298,40.028146 +1191140,3,SMEMDICO,-105.014212,40.12768 +1191141,3,SPJVWLCO,-104.962637,37.734537 +1191142,3,SVCBSBCO,-105.222304,40.205292 +1191162,3,WDGRESCO,-104.987202,37.511798 +1191163,3,WWHRESCO,-104.990888,37.510189 +1191164,1,384737076514201,-76.8618056,38.79366667 +1191165,1,384738076514301,-76.862,38.7938333 +1192659,1,16891750,134.4504694,7.34769722 +1192660,1,16891780,134.4516056,7.333725 +1192661,1,16891700,134.4527778,7.35388889 +1192662,1,320647110553500,-110.9264583,32.1130611 +1192663,1,320750110562300,-110.9397111,32.13050278 +1191166,1,384742076513501,-76.8596667,38.795 +1192664,1,320660110553500,-110.92645,32.11656667 +1191167,1,360359112103900,-112.177636,36.0662861 +1191168,1,384929076524801,-76.8800833,38.8248333 +1191169,1,384725076521301,-76.8703056,38.79027778 +1191170,1,384841076510101,-76.85025,38.8113333 +1191171,1,384720076514501,-76.8625556,38.78888889 +1191172,1,384717076514801,-76.86348889,38.78813889 +1191173,1,384937076511201,-76.85327778,38.82702778 +1191174,1,0308595431,-80.26088889,40.50675278 +1191175,1,384918076505301,-76.84813889,38.8217222 +1191176,1,14178490,-121.9689444,44.75891667 +1192665,1,320713110555300,-110.9314111,32.1201611 +1192666,1,16891500,134.6266667,7.60333333 +1191177,1,384737076520701,-76.8687222,38.7935 +1191178,1,422852071161400,-71.2704611,42.48101944 +1192667,1,16890800,134.5272222,7.4625 +1191965,1,0110057380,-71.2696667,42.4813333 +1191179,1,02437107,-88.7814222,34.00172778 +1191180,1,07241512,-97.3708333,35.42666667 +1191181,1,422857071160100,-71.2669833,42.48258889 +1191182,1,362227119531401,-119.8872472,36.3742611 +1192668,1,06782600,-99.7028932,41.4325059 +1191183,1,014649016,-75.1353333,40.2092222 +1191184,1,030859550,-80.2306667,40.50466667 +1191185,1,01484689,-75.0598333,38.5412222 +1192669,1,041275518,-85.3320806,45.03073889 +1191186,1,14178625,-121.9865,44.76038889 +1191187,1,0308595550,-80.20888889,40.50030556 +1192670,1,06799850,-97.0594785,41.52084094 +1191188,1,0110057120,-71.3043056,42.4528333 +1192671,1,320704110543400,-110.9094306,32.11768889 +1191189,1,384727076520201,-76.8673056,38.79088889 +1191190,1,384729076520201,-76.86713889,38.79127778 +1192672,1,02492323,-89.5992694,30.71825 +1191191,1,384730076504201,-76.8450556,38.79152778 +1192673,1,06810400,-96.1986199,40.66805704 +1192674,1,06839700,-100.6298707,40.59223085 +1192675,1,06806470,-96.1122324,40.8627786 +1192676,1,16891200,134.5269444,7.37166667 +1191192,1,07292450,-91.0154306,31.25074167 +1191193,1,361240119340701,-119.568636,36.211 +1192677,1,02476465,-88.6201806,32.39530833 +1191194,1,11491450,-121.4590556,42.95166667 +1191195,1,01477790,-75.5263102,39.7662244 +1192678,1,0308595551,-80.2076111,40.49705556 +1192679,1,03085955513,-80.207,40.4957222 +1191196,1,355422119223201,-119.375575,35.9061333 +1191197,1,384720076515601,-76.8654444,38.78877778 +1192680,1,03085955516,-80.2073056,40.4953333 +1192681,1,03085955519,-80.2073333,40.49488889 +1191198,1,384724076535401,-76.89827778,38.78988889 +1191199,1,14178620,-121.9818333,44.75805556 +1192682,1,0308595552,-80.2070278,40.4935 +1191200,1,02447065,-89.1243917,33.28682778 +1191201,1,384947076523701,-76.87688889,38.8296111 +1191202,1,03592711,-88.2347556,34.80729444 +1191203,1,384715076514801,-76.8634722,38.7874722 +1192683,1,0308595553,-80.2051111,40.48977778 +1191204,1,360558112101000,-112.1694722,36.09933889 +1191205,1,02440370,-89.0458611,33.7765361 +1192684,1,88240606323,-76.8579722,39.40663889 +1192685,1,88240606324,-76.8579722,39.40663889 +1191206,1,02436434,-88.6354111,34.0933583 +1191207,1,422901071171000,-71.28598889,42.48358889 +1191208,1,384709076514001,-76.8611667,38.78577778 +1191209,1,371144082383401,-82.6428778,37.19571667 +1192686,1,0308595554,-80.204,40.4856111 +1192687,1,16891310,134.5432222,7.38761111 +1191210,1,384805076492901,-76.8248333,38.80130556 +1192688,1,02476455,-88.6081722,32.39793333 +1191211,1,014648882,-75.16602778,40.20252778 +1192689,1,16890650,134.5702778,7.59666667 +1192690,1,413918070490101,-70.8169,41.65510556 +1191212,1,384956076525501,-76.8819722,38.83225 +1191213,1,0728864450,-90.8347778,33.6017222 +1191214,1,02482732,-89.4216417,32.3597472 +1191215,1,07269470,-88.9449611,34.72964167 +1191216,1,360556112080300,-112.1342444,36.0988861 +1191217,1,422821071182600,-71.3072,42.4724 +1192691,1,16891420,134.6030278,7.50930556 +1191218,1,03353603,-86.24,39.75116667 +1191219,1,384706076510501,-76.8513611,38.78491667 +1191220,1,14178480,-121.9609722,44.7526111 +1192692,1,0308595558,-80.2000833,40.4780833 +1191221,1,07286335,-89.9640667,33.5633833 +1192693,1,413844070464701,-70.7797,41.6455 +1192694,1,06883540,-97.820597,40.11389784 +1191222,1,07290975,-90.7253611,31.5868472 +1192695,1,414231070453201,-70.7589,41.7086583 +1191223,1,422805071160500,-71.26795,42.46808056 +1191224,1,422811071160300,-71.2674306,42.46978889 +1192696,1,06789100,-98.9023072,41.40584385 +1192697,1,01398071,-74.81327778,40.5692222 +1191225,1,07377386,-91.0672389,31.068075 +1192698,1,0308595559,-80.1983056,40.4668333 +1191226,1,02437115,-88.750825,33.96598889 +1191227,1,07241507,-97.4136028,35.4350972 +1191228,1,07286310,-89.9880556,33.61160278 +1191229,1,0729068850,-90.8007861,31.80813056 +1192699,1,16891400,134.576861,7.44005556 +1191230,1,07290685,-90.8172472,31.81750278 +1191231,1,07292453,-91.0693583,31.26780556 +1191232,1,03107757,-80.30188889,40.51538889 +1191233,1,07030393,-89.348475,34.92446389 +1192700,1,414211070451401,-70.7539,41.70313889 +1191234,1,02437105,-88.7653722,34.0016611 +1191235,1,03209310,-82.63506389,37.16835278 +1191236,1,01483620,-75.4891944,39.15405556 +1192701,1,422844071174701,-71.2965111,42.4788583 +1191237,1,422844071174800,-71.2966306,42.4788111 +1191238,1,02483753,-89.1766944,33.24463056 +1191615,1,11152880,-121.2759028,37.04368056 +1191239,1,0112779610,-72.24175,41.3232222 +1192381,1,14178440,-121.927611,44.76630556 +1192702,1,04183030,-84.91575,41.17416667 +1191240,1,04183032,-84.9126,41.1726 +1191241,1,422859071171200,-71.2867611,42.48296944 +1191242,1,07277850,-90.0245611,34.7888083 +1192703,1,06815510,-95.6077633,40.1433344 +1191243,1,02440230,-88.9823222,33.97304167 +1192704,1,01398072,-74.80338889,40.56566667 +1191244,1,02440210,-89.0186694,33.9353083 +1192705,1,01653560,-76.8431111,38.7853333 +1191246,1,07290630,-90.8180806,31.97480833 +1191247,1,07289069,-89.0986889,33.53678889 +1192706,1,04127551,-85.3318806,45.09798889 +1191248,1,02434460,-88.7076278,34.45060278 +1191249,1,02447070,-89.1206833,33.25765556 +1192707,1,01575504,-76.75138889,39.97 +1192708,1,06810060,-95.7536058,40.4438908 +1191250,1,07287149,-90.1380944,33.34281667 +1191251,1,07286530,-89.8893417,33.5245472 +1192709,1,01653620,-76.90225,38.79841667 +1191253,1,360552112110000,-112.183361,36.09771944 +1191254,1,030859554,-80.2068056,40.471 +1191255,1,0213551460,-80.4639444,33.9891111 +1191256,1,02482731,-89.392925,32.3569861 +1192710,1,01571071,-76.8806667,40.28166667 +1191257,1,07287595,-90.5395833,32.66837778 +1192711,1,041275505,-85.3449306,45.1076194 +1191258,1,02440005,-88.7452306,33.8397361 +1192712,1,02476486,-88.6599,32.3894361 +1191259,1,01581672,-76.4877667,39.57366667 +1191260,1,0248229120,-89.2676944,33.15027778 +1191261,1,0728900350,-90.8204056,32.3312972 +1191262,1,07282072,-89.1562778,33.738975 +1191263,1,07030394,-89.3438,34.94638889 +1191264,1,01583040,-76.7771806,39.4872583 +1191265,1,07289442,-89.6586694,32.9838111 +1192713,1,0308595548,-80.1988611,40.4671111 +1191266,1,03353626,-86.23375,39.7163611 +1191267,1,14178470,-121.9347778,44.7444722 +1191268,1,0213551470,-80.45225,33.9435 +1191269,1,07287145,-89.9746972,33.3948083 +1191270,1,0110056950,-71.2648611,42.4705833 +1192714,1,01398073,-74.79327778,40.5616111 +1191271,1,07279050,-90.1569111,34.7225861 +1192715,1,01479775,-75.7071111,39.842 +1192716,1,16891300,134.5519444,7.38333333 +1191272,1,88012345001,-89.808,42.98026389 +1192717,1,88240606303,-89.808,42.98026389 +1192718,1,88240606306,-89.808,42.98026389 +1192719,1,88240606307,-89.808,42.98026389 +1192720,1,88240606308,-89.808,42.98026389 +1192721,1,88240606309,-89.808,42.98026389 +1191273,1,07290175,-90.8563472,32.17011667 +1191274,1,02440255,-88.99915,33.86939167 +1191275,1,07241513,-97.3732667,35.44689444 +1191276,1,07270836,-89.5806944,34.40210278 +1191277,1,422904071163800,-71.2771111,42.48455 +1191278,1,07282006,-89.3446583,33.851925 +1191279,1,07286330,-90.0386333,33.583475 +1192722,1,02492314,-89.585875,30.7526222 +1191280,1,02439985,-88.9181361,33.97990556 +1191281,1,07294945,-91.3018667,31.14178333 +1191282,1,015783428,-75.9696556,39.95999444 +1191283,1,07282095,-89.1467694,33.7900972 +1191284,1,02482735,-89.4457889,32.36196944 +1191285,1,02086799,-78.8605694,36.02455 +1191286,1,16638300,-156.669861,20.8866111 +1192723,1,414122070444901,-70.747,41.68931389 +1191287,1,07283320,-89.4855611,33.9515472 +1191288,1,02482670,-89.3492806,32.35281667 +1191289,1,384724076542301,-76.9063333,38.79 +1191290,1,07282230,-89.3198,33.6493833 +1191291,1,01582650,-76.6170056,39.53396389 +1191292,1,01573684,-76.55452778,40.22519444 +1191293,1,02439993,-88.75101389,33.89848056 +1192724,1,414102070441801,-70.7382,41.6837611 +1191294,1,422907071161300,-71.2702611,42.48528056 +1191295,1,07281980,-89.2796139,33.8553472 +1191296,1,0728714810,-90.0696278,33.35408056 +1191297,1,07376684,-90.7853278,31.04403056 +1191298,1,01578143,-76.2843917,39.7021361 +1191299,1,414104104501401,-104.8372389,41.68438056 +1191300,1,01581677,-76.4529417,39.58921667 +1191301,1,371016082381001,-82.6361306,37.1710722 +1191302,1,01578367,-76.0359944,39.84078889 +1191303,1,16638700,-156.6850278,20.88494444 +1191304,1,015757495,-76.4058611,40.1633861 +1191305,1,01578428,-76.1164722,39.85440556 +1191306,1,07267035,-88.9218583,34.4133611 +1192725,1,414044070440401,-70.7344,41.67899444 +1192726,1,414059070433501,-70.7264,41.68294167 +1191307,1,02482675,-89.3384028,32.35137778 +1192727,1,030850498,-79.91563889,40.41730556 +1191308,1,07289229,-89.4797417,33.31645833 +1192728,1,16890900,134.525,7.45080556 +1191309,1,02440375,-89.0124111,33.78742778 +1192729,1,414035070443001,-70.7416,41.67641389 +1191310,1,384654076552501,-76.9236667,38.78169444 +1191311,1,07290689,-90.8217,31.8451 +1192730,1,030859556,-80.19775,40.4661111 +1191312,1,07376765,-90.9916667,31.1978 +1191313,1,01577355,-76.4601472,39.8145111 +1191314,1,07289224,-89.403375,33.2973472 +1191315,1,0728946418,-89.7367306,32.87718333 +1191316,1,02440050,-89.0352611,34.03816667 +1191317,1,374815087555101,-87.9306944,37.8041111 +1191318,1,01577419,-76.39780278,39.786 +1191319,1,02439992,-88.7639444,33.8985472 +1191320,1,422832071154700,-71.2631194,42.47553056 +1191321,1,07289227,-89.4503889,33.30704167 +1191322,1,360557112064100,-112.111361,36.0991111 +1191323,1,07289322,-89.5308889,33.22124167 +1191324,1,01576303,-76.1892194,40.1163472 +1191325,1,02440360,-89.0312667,33.81260278 +1191326,1,040975298,-85.2574861,41.839875 +1191327,1,01580169,-76.3384333,39.6189472 +1191328,1,01580360,-76.2867056,39.5942611 +1191329,1,422851071154200,-71.2617194,42.4808 +1192731,1,16890700,134.5544444,7.52111111 +1191330,1,07281964,-89.1767639,33.9502472 +1191331,1,07282970,-89.3228222,34.1020083 +1191332,1,0157578120,-76.4946306,40.1728583 +1191333,1,015760852,-75.995725,40.14583889 +1191334,1,07281985,-89.2755417,33.8433583 +1191335,1,07289257,-89.6949694,33.3615861 +1192732,1,11023100,-117.188111,32.78952778 +1191336,1,07291920,-90.9125528,31.33413889 +1191337,1,015783478,-75.9791944,39.88959167 +1191338,1,04194075,-83.46888889,41.67277778 +1191339,1,0248229110,-89.2266889,33.1195472 +1191340,1,01577245,-76.5314444,39.75353056 +1192733,1,06610700,-96.2197398,41.5455496 +1191341,1,02483755,-89.1951722,33.23963333 +1191342,1,04194076,-83.4561111,41.6883333 +1191343,1,01661499,-76.5334722,38.25277778 +1191344,1,07290082,-90.4147222,32.2706222 +1191345,1,07282070,-89.1514917,33.7430722 +1191346,1,07061155,-91.054851,37.59004675 +1191347,1,04194077,-83.4533333,41.6972222 +1191348,1,07267030,-88.932325,34.41890278 +1192734,1,01362358,-74.2966111,42.10119444 +1191349,1,015767745,-76.1912667,39.9557611 +1191350,1,07292454,-91.0638944,31.280675 +1192735,1,02476460,-88.6161,32.39610278 +1191351,1,01152755,-72.7044333,43.39426389 +1191352,1,07286510,-89.853625,33.524825 +1191353,1,03130647,-82.5180556,40.76527778 +1191354,1,07289445,-89.6669083,33.01080278 +1192736,1,06767100,-100.2565237,40.701674680000004 +1191355,1,360420112130600,-112.2182583,36.07213889 +1191356,1,384446076504701,-76.8464167,38.7460833 +1191357,1,02482299,-89.3473167,33.0483722 +1191358,1,01585687,-76.8888361,39.58623889 +1191359,1,03209325,-82.6045694,37.1878333 +1191360,1,02484010,-89.5657889,33.00611389 +1192737,1,041275689,-85.27701389,44.8808861 +1192738,1,01573816,-77.10077778,39.87805556 +1192739,1,11022830,-117.0633972,32.778325 +1191361,1,01575734,-76.4179667,40.20404167 +1191362,1,0163287828,-78.7155028,38.56496944 +1191363,1,07376769,-90.9993028,31.1463361 +1192740,1,01571102,-76.8518056,40.2485 +1191364,1,07269390,-89.0838444,34.7741833 +1191365,1,11491470,-121.459361,42.9783611 +1191366,1,01578395,-76.07155278,39.90073056 +1191367,1,07289670,-90.2067361,32.7133472 +1192741,1,016141305,-77.66075,39.93991667 +1191368,1,07287080,-90.0791528,33.4472111 +1191369,1,07291925,-90.9271778,31.34891944 +1191370,1,07292455,-91.0567778,31.28138333 +1191371,1,07289475,-89.9731778,32.9125611 +1192742,1,01123745,-72.0255917,42.07786389 +1191372,1,07286525,-89.8644472,33.49255 +1191373,1,07289390,-89.7137111,33.16598889 +1192743,1,07277900,-89.9954722,34.8719333 +1191374,1,07291730,-90.8893667,31.58246944 +1191375,1,01581958,-76.6798833,39.6702611 +1191376,1,07286710,-89.9237083,33.5182861 +1191377,1,07295030,-90.4415056,32.15615833 +1191378,1,01576381,-76.3217222,40.2710833 +1192744,1,01487165,-75.6176944,38.6863611 +1191379,1,07282073,-89.1764167,33.7391583 +1191380,1,042085017,-81.7552778,41.4186111 +1191381,1,02440365,-88.9945556,33.81114167 +1191382,1,07289320,-89.5339306,33.24703333 +1191383,1,07289402,-89.6887972,33.08894167 +1191384,1,07030367,-89.1881528,34.8956083 +1191385,1,07273990,-89.5074083,34.28789167 +1191386,1,330802107104110,-107.1780278,33.13379444 +1191387,1,04085168,-87.1979444,45.00375 +1191388,1,01577980,-76.3412111,39.6736361 +1191389,1,07277340,-89.896,34.8011222 +1191390,1,07289976,-90.5233361,32.46995278 +1191391,1,01575952,-76.5295444,40.0718 +1191392,1,02439850,-88.9658139,34.05688056 +1191393,1,02440260,-88.9676972,33.84833889 +1191394,1,02482291,-89.24155,33.13214167 +1191395,1,07270802,-89.5453444,34.45792778 +1191396,1,01574318,-76.6548056,40.0858222 +1191397,1,400521075461401,-75.7704167,40.0892222 +1192745,1,01480777,-75.7179722,40.0050833 +1192746,1,015319015,-76.6668056,41.71691667 +1191398,1,07281996,-89.3050139,33.855175 +1192747,1,06837100,-100.4890369,40.1911162 +1191399,1,07288545,-90.4681028,33.91284167 +1191400,1,02440270,-88.9438333,33.8303222 +1191401,1,07331299,-96.7173139,34.3727222 +1191402,1,04085169,-87.1919722,44.98555556 +1192748,1,06767300,-100.215133,40.7025078 +1192749,1,01569315,-77.5233056,40.0495 +1191403,1,400356075494501,-75.82927778,40.0656111 +1191404,1,01584249,-76.5184472,39.53560278 +1191405,1,02484013,-89.5971806,32.9898611 +1191406,1,02440070,-89.0270056,33.9728722 +1191407,1,07270640,-89.4896806,34.513025 +1191408,1,0213551475,-80.40313889,33.9470833 +1191409,1,02440390,-88.8499361,33.840775 +1191410,1,11491950,-121.8735556,43.1833333 +1191411,1,07288627,-90.8967806,33.92282778 +1191412,1,06425050,-103.3641278,44.22389444 +1191413,1,07289333,-89.6259306,33.22313889 +1191414,1,08105046,-97.826,30.8106 +1191415,1,02440395,-88.8495722,33.82611389 +1191416,1,07290160,-90.7671667,32.116625 +1191417,1,07281950,-89.1005306,33.88484167 +1191418,1,07286280,-89.8868944,33.6523083 +1191419,1,07290740,-91.1197306,31.94364167 +1192750,1,01571080,-76.8786111,40.27188889 +1192751,1,06799423,-97.0489358,42.46666665 +1191420,1,02174075,-80.6093333,33.18616667 +1192752,1,06810300,-96.2169535,40.66666807 +1192753,1,320703110553400,-110.9261,32.11743056 +1192754,1,320704110553600,-110.92675,32.11763056 +1192755,1,09482375,-110.9279167,32.11815833 +1192756,1,09482385,-110.9395417,32.12605 +1191421,1,07290665,-90.7406833,31.8057472 +1191422,1,07282325,-89.5004583,33.76246667 +1192757,1,02174140,-80.5751111,33.24119444 +1191423,1,07290835,-91.1270167,31.74405278 +1192758,1,320742110563100,-110.9420306,32.12835 +1192759,1,06849600,-99.3681548,40.32584415 +1191424,1,07288631,-90.9469444,33.89469444 +1192760,1,09482390,-110.953125,32.133475 +1192761,1,320805110571800,-110.9550722,32.1346472 +1192762,1,413858070483201,-70.809,41.64945556 +1191425,1,0216239615,-82.4200833,35.1323333 +1191426,1,07283710,-89.6013861,34.03847778 +1192763,1,413846070480601,-70.8018,41.64603889 +1192764,1,14150250,-122.4336,43.98478056 +1191427,1,01467183,-75.0347222,39.91591667 +1191428,1,02439900,-88.9296389,34.05190556 +1191429,1,07289255,-89.6428861,33.39665 +1191430,1,07288649,-90.8062583,33.600980560000004 +1192765,1,413813070474301,-70.7952,41.63690556 +1191431,1,14185600,-122.1690556,44.5013333 +1191432,1,07286340,-90.0553833,33.5791611 +1192766,1,413824070470401,-70.7845,41.64006389 +1192767,1,423302071132001,-71.2222306,42.55041667 +1191433,1,07287148,-90.0719417,33.3472361 +1191434,1,07030377,-89.2488389,34.98393056 +1191435,1,07276495,-89.6257889,34.74369167 +1191436,1,07288741,-90.9972778,33.53041667 +1191437,1,07288630,-90.9189167,33.8532222 +1191438,1,10257650,-116.5960083,33.9961722 +1191439,1,07277945,-90.0778694,34.84090278 +1192768,1,06767400,-100.1659639,40.7316744 +1191440,1,02175095,-80.66738889,32.90813889 +1191441,1,02175100,-80.6674722,32.90827778 +1191442,1,07281240,-90.5992722,31.57371667 +1191443,1,07281955,-89.1063056,33.87864444 +1192769,1,01576706,-76.34288889,40.03805556 +1191444,1,02483765,-89.2886278,33.22085278 +1191445,1,14185865,-122.335,44.58105556 +1191446,1,14184300,-122.278,44.40475 +1191447,1,09504350,-111.7461944,34.98775 +1191448,1,05390650,-89.394925,45.8716944 +1191449,1,021926980,-82.3017222,34.24 +1191450,1,07286290,-89.963475,33.6540083 +1191451,1,02174080,-80.581,33.1336111 +1191452,1,433812106353901,-106.5941889,43.63675 +1192770,1,04026590,-90.9780556,46.35555556 +1191453,1,02483770,-89.3266111,33.2136472 +1191454,1,016701405,-78.00673889,38.139 +1191455,1,02131135,-79.7623611,34.17302778 +1191456,1,07293225,-91.1151194,31.38964444 +1191457,1,14159130,-122.085,43.95702778 +1191458,1,07191322,-94.9892139,36.31161944 +1191613,1,11152850,-121.2875556,37.08669444 +1191459,1,01670209,-77.8948361,38.1386833 +1192771,1,021305805,-79.6856667,34.61980556 +1191460,1,02439950,-88.8935111,34.0212972 +1191461,1,040265935,-90.9450833,46.41016667 +1191462,1,07287060,-90.0321389,33.4781972 +1192382,1,14178610,-121.9968889,44.7779444 +1192772,1,01123365,-72.1185611,42.1095472 +1192379,1,14174450,-121.966,44.5990833 +1191463,1,04290702,-72.3182583,44.50561389 +1191464,1,07287070,-90.0637806,33.49766389 +1191465,1,02169585,-80.9808333,33.955 +1191466,1,02440245,-88.9532611,33.88021944 +1191614,1,11152870,-121.2910833,37.0494722 +1192773,1,02169590,-80.9890556,33.94788889 +1191467,1,11438450,-120.3111694,38.76983889 +1192774,1,0215329875,-81.45595,35.2753611 +1191468,1,0702927685,-88.51965,34.7700583 +1191469,1,0729054994,-90.5860194,32.09101944 +1191470,1,07289269,-89.7286722,33.33991944 +1192775,1,0217203505,-79.80938889,33.1312222 +1191471,1,02157520,-82.09963889,34.92716667 +1192776,1,02157530,-82.0837778,34.9128611 +1192777,1,0217252503,-81.6714722,33.59975 +1191472,1,01483750,-75.46052778,39.0848611 +1192377,1,14158977,-122.056,44.1782222 +1191473,1,424507104252301,-104.4230194,42.7519 +1191474,1,01670144,-77.94763889,38.11874167 +1192778,1,06806460,-96.1197398,40.85499919 +1192779,1,06767410,-100.1454245,40.68693286 +1191475,1,07376774,-90.9455389,31.04665278 +1191476,1,0219562950,-82.1794444,33.9241111 +1191477,1,08104866,-97.9378,30.66 +1192780,1,07029414,-88.8841306,34.93897778 +1191478,1,01155303,-72.8152472,43.19251389 +1191962,1,01642600,-77.36025,39.4095 +1192781,1,04164151,-82.90455,42.7171833 +1192782,1,11046325,-117.5370556,33.4193333 +1191479,1,03341558,-87.4618167,39.4612333 +1192783,1,01123620,-72.0441472,42.081175 +1191480,1,07291258,-90.690325,31.5092 +1191481,1,04284574,-72.5151556,44.2096972 +1191482,1,03347598,-85.4872361,40.17018889 +1191483,1,07282098,-89.3155667,33.805975 +1191484,1,03361617,-85.8580556,39.5395833 +1191485,1,040265981,-90.84075,46.4302222 +1191486,1,14170350,-123.3990278,44.5476944 +1191616,1,11152890,-121.3100556,37.03480556 +1191487,1,02023480,-79.3236111,37.80521389 +1192784,1,021474750,-80.9827222,34.61213889 +1192785,1,14144780,-122.3141694,43.50083056 +1191488,1,02161805,-81.2457222,34.3933333 +1191489,1,02195665,-82.0021111,33.88925 +1191490,1,11136045,-120.43335,34.76691944 +1191491,1,07282700,-89.1869889,34.0303083 +1192786,1,14147200,-122.2451306,43.88468889 +1191492,1,06209510,-109.2965443,45.1207783 +1191493,1,425116087591501,-87.987612,42.85446135 +1191494,1,360013118575201,-118.9643639,36.0036722 +1191495,1,02172310,-81.6121111,33.69380556 +1191496,1,07030373,-89.2547028,34.97991944 +1191497,1,341812111210000,-111.3501083,34.3034472 +1191498,1,06339200,-102.6044444,47.1825833 +1191499,1,01656978,-77.4577444,38.79729167 +1191500,1,07289860,-90.3963806,32.5452472 +1192787,1,14306950,-123.6115806,43.92113889 +1191501,1,03075590,-79.4120278,39.49255556 +1192788,1,09537700,-109.2670861,31.35136944 +1191502,1,01651812,-76.9708333,38.87991667 +1192789,1,0217689150,-81.0121667,32.23627778 +1191503,1,02153480,-81.5502111,35.12643889 +1191504,1,07288640,-90.8813667,33.73284444 +1191505,1,03327528,-86.221,40.7295833 +1192790,1,08181447,-98.60135,29.39388056 +1191506,1,07282950,-89.2729889,34.02078889 +1191507,1,11174160,-121.8852917,37.58362778 +1192791,1,08181460,-98.5858333,29.36555556 +1191508,1,03294445,-85.7914722,38.3003611 +1192792,1,14307605,-123.7946889,44.0565 +1192793,1,14039320,-119.492,44.1243611 +1191509,1,07289150,-89.4355389,33.44135278 +1191510,1,016702576,-77.8265722,38.0954 +1191511,1,395459075381301,-75.6369167,39.91630556 +1191512,1,021624101,-82.5251111,34.9390833 +1191975,1,442746083212201,-83.3562444,44.4627333 +1191513,1,04137716,-83.34156389,44.44067778 +1191514,1,07290723,-90.9622306,31.9537722 +1192794,1,14322810,-123.5646389,43.6352222 +1191515,1,14326300,-124.04025,43.0347222 +1192795,1,14190610,-123.1623,44.73008889 +1191516,1,05335492,-92.365225,45.8534972 +1192796,1,05429510,-89.3025,43.0047222 +1191517,1,02175720,-80.8728333,32.9904722 +1191518,1,04203983,-81.4972222,41.12305556 +1191519,1,04204066,-81.5252778,41.1172222 +1192797,1,470043113225701,-113.3826222,47.01183056 +1192798,1,470020113224901,-113.3802917,47.00552778 +1191520,1,341711109210800,-109.3522639,34.2863111 +1191521,1,01029100,-68.7939056,46.1343611 +1192799,1,09313520,-110.8577722,39.6373833 +1191522,1,02174480,-80.3489444,33.14177778 +1192349,1,03269817,-84.0504914,39.84311438 +1191523,1,03323090,-85.3471111,40.8219722 +1191524,1,07275520,-89.9796278,34.17685278 +1191525,1,04208509,-81.7036111,41.4897222 +1191526,1,06332190,-102.7797361,48.21188056 +1191527,1,07106510,-104.6005556,38.27444444 +1192800,1,14078250,-120.0143056,44.02005556 +1192801,1,14078260,-120.0433056,44.062 +1191528,1,03324095,-85.6020833,40.86880556 +1191529,1,021320550,-79.6566667,33.92 +1191530,1,03324112,-85.6478333,40.8427222 +1191531,1,14165250,-122.9993056,44.07855556 +1192802,1,01019997,-67.394754,45.15478337 +1191532,1,03197937,-81.60695,38.3692472 +1191533,1,07285515,-89.8404833,33.799125 +1192803,1,14312330,-123.4477,43.2517611 +1191534,1,041377255,-83.3307472,44.4170611 +1192804,1,03012545,-79.004925,41.8386722 +1191535,1,05427080,-88.837,42.92805556 +1191536,1,352533118494601,-118.8293556,35.42582778 +1191537,1,351813119150601,-119.2516472,35.3035361 +1192805,1,03311513,-86.27325,37.19719444 +1192806,1,01444802,-75.0835478,40.829114 +1191538,1,07185188,-94.8191889,36.79862778 +1191539,1,06337300,-102.7664722,47.5978611 +1191540,1,325505109500200,-109.8338917,32.91817778 +1191541,1,0137203360,-73.9430556,41.85116667 +1191542,1,325918110455100,-110.7642222,32.98835278 +1191543,1,03569600,-85.4074,35.06401667 +1191544,1,09379700,-110.4389694,37.25265278 +1191545,1,08161400,-96.4172222,29.58 +1191546,1,09529210,-114.5202639,32.7246861 +1191547,1,09328960,-110.0735389,38.01001944 +1192807,1,02419870,-86.138,32.42756667 +1192808,1,03587320,-87.44175,34.92055 +1192809,1,03590945,-88.0243111,34.9561 +1191548,1,15007990,-130.040261,56.0451222 +1191549,1,15015591,-130.743011,56.33915278 +1191550,1,15226605,-145.8950583,61.08373889 +1191551,1,15238951,-151.0003889,59.6966056 +1192810,1,15564880,-150.2925,67.01943889 +1191552,1,644231150003400,-150.0094,64.7086333 +1191553,1,700646152112000,-152.1888528,70.1127611 +1191554,1,700825152071300,-152.120311,70.1404056 +1191555,1,701008151561200,-151.9366,70.16888889 +1191556,1,701259151583700,-151.9768139,70.2163056 +1191557,1,09404061,-112.0967056,35.88513056 +1192811,1,09482374,-110.9265278,32.11540556 +1192812,1,09482386,-110.9398333,32.127975 +1191558,1,09482490,-110.9885333,32.20705278 +1191559,1,09482495,-110.9833056,32.2142222 +1191560,1,09491500,-109.8834167,33.9972222 +1191561,1,09520900,-114.6019333,32.72652778 +1192813,1,320658110553700,-110.9269194,32.1161111 +1192814,1,320704110553500,-110.9264222,32.1177111 +1192815,1,320707110554400,-110.9288889,32.1187 +1192816,1,320717110573700,-110.9602056,32.12126667 +1192817,1,320720110560400,-110.9345111,32.12218889 +1192818,1,320729110561800,-110.9384,32.12468889 +1192819,1,320730110573700,-110.9603639,32.12490833 +1192820,1,320733110562100,-110.9392694,32.12586944 +1191562,1,331937112400301,-112.6675,33.32694444 +1191563,1,331954112382701,-112.6408333,33.33166667 +1191564,1,331955112394301,-112.6619444,33.33194444 +1191565,1,332006112383601,-112.6433333,33.335 +1191566,1,332049112372601,-112.6238889,33.34694444 +1191567,1,332054112322401,-112.54,33.3483333 +1191568,1,332058112352401,-112.59,33.34944444 +1191569,1,332125112321901,-112.538611,33.35694444 +1191570,1,332136112311701,-112.5213889,33.36 +1191571,1,332246112194601,-112.32955,33.37938056 +1191572,1,332251112193001,-112.325,33.3808333 +1191573,1,332252112181201,-112.3033333,33.3811111 +1191574,1,332253112201401,-112.3372222,33.38138889 +1191575,1,332301112212001,-112.3555556,33.3836111 +1191576,1,332304112214701,-112.3630556,33.38444444 +1191577,1,332310112161201,-112.27,33.3861111 +1191578,1,332318112215001,-112.3638889,33.3883333 +1191579,1,345556111386000,-111.6499306,34.9322333 +1191580,1,345606111384900,-111.647075,34.93511667 +1191581,1,345609111385100,-111.6475472,34.93577778 +1191582,1,345707110315000,-110.5304722,34.9520333 +1191583,1,345724111403500,-111.6763444,34.9566472 +1191584,1,345831111410600,-111.6850972,34.97523889 +1191585,1,350228111410800,-111.6856639,35.04105556 +1191586,1,350234111410900,-111.6857833,35.04272778 +1191587,1,350236111411200,-111.6866833,35.043425 +1191588,1,350530111424000,-111.7111194,35.09176389 +1191589,1,350531111420700,-111.7018667,35.09189444 +1191590,1,350535111412600,-111.6904556,35.09306667 +1191591,1,350535111421000,-111.7026806,35.0931222 +1191592,1,350552111413600,-111.6933583,35.09782778 +1191593,1,360452112083601,-112.1433167,36.0812333 +1191594,1,360452112124100,-112.2113722,36.0810861 +1191595,1,360719112135800,-112.2326667,36.12185278 +1191596,1,360935109343201,-109.57555,36.1596 +1191597,1,361105112183600,-112.309975,36.18471667 +1191598,1,362534112372700,-112.6241389,36.42618056 +1191599,1,362936109293301,-109.4925,36.49335 +1191600,1,363052109282001,-109.4722,36.51455 +1191601,1,363141109030401,-109.0511111,36.52813889 +1191602,1,363235109133801,-109.2272222,36.54305556 +1191603,1,363235109133901,-109.2275,36.54316667 +1191604,1,364243109031801,-109.0551111,36.7119722 +1191605,1,364306109375001,-109.63043330000001,36.7182 +1191606,1,364450109030701,-109.0522,36.74743889 +1191607,1,365216109061601,-109.1041667,36.8712472 +1191608,1,365527109362101,-109.6057389,36.92429167 +1191609,1,07048493,-94.1494333,36.0449333 +1191610,1,07264042,-92.1161583,34.92505278 +1191611,1,07264043,-92.1161194,34.91833056 +1191612,1,09522990,-114.468111,32.88494444 +1191617,1,330534115421001,-115.7026944,33.09280556 +1191618,1,330653115450801,-115.7522222,33.1147222 +1191619,1,330711115413501,-115.6929722,33.1197222 +1191620,1,330808115400201,-115.6673333,33.1356111 +1191621,1,341011118284001,-118.477886,34.16971667 +1191622,1,341105118310601,-118.518375,34.1848111 +1191623,1,351838119200901,-119.3585,35.32566667 +1191624,1,372507121594801,-121.9971389,37.41863889 +1191625,1,372512121594601,-121.9959833,37.419875 +1191626,1,372524121585101,-121.9807222,37.4232083 +1191627,1,372609122055001,-122.097175,37.43583889 +1191628,1,372610122055001,-122.0972806,37.43599444 +1191629,1,372700122040801,-122.068836,37.45002778 +1191630,1,372812122035001,-122.0639472,37.47 +1191631,1,372948122074101,-122.1281333,37.4966833 +1191632,1,373211119392601,-119.6571139,37.5363 +1192821,1,373306119411401,-119.6872972,37.55163056 +1191633,1,373622122081101,-122.136375,37.6061583 +1191634,1,373632122084701,-122.1464278,37.6090083 +1191635,1,373644122081101,-122.1365194,37.6121972 +1191636,1,373653122075201,-122.131111,37.61459444 +1191637,1,373814122085301,-122.1481417,37.63734444 +1191638,1,373845122171901,-122.2886278,37.645825 +1192822,1,374009119490301,-119.8173972,37.66926667 +1191639,1,374126122110501,-122.184725,37.6905361 +1192823,1,374244119333801,-119.5606889,37.71211667 +1192824,1,374254119395401,-119.665061,37.71511667 +1191640,1,374311122210401,-122.3509972,37.71983889 +1192825,1,374333119314901,-119.5301833,37.7259583 +1191641,1,374345119233401,-119.3927139,37.72910278 +1192826,1,374345119333301,-119.5590472,37.72914167 +1191642,1,374407119304901,-119.5135639,37.73518056 +1191643,1,374419119234401,-119.395661,37.73856389 +1192827,1,374422119500501,-119.8347944,37.7395361 +1191644,1,374427122195501,-122.332,37.7409 +1192828,1,374435119353501,-119.592961,37.7431611 +1192829,1,374437119335901,-119.5663167,37.743675 +1191645,1,374446119260701,-119.4354083,37.74605556 +1192830,1,374453119354601,-119.5959944,37.74793056 +1191646,1,374610122182501,-122.30695,37.76933056 +1191647,1,374746119203701,-119.3436194,37.7961861 +1191648,1,375012122180801,-122.302275,37.836575 +1191649,1,375117119192101,-119.3224417,37.85470278 +1191650,1,375152122183701,-122.3102389,37.86445278 +1192831,1,375245119180901,-119.3024667,37.8792111 +1191651,1,375322121342901,-121.5746694,37.8893 +1191652,1,375350122191101,-122.3198028,37.8973111 +1191653,1,375414122191101,-122.319811,37.90399444 +1191654,1,375513121332101,-121.5556889,37.9202611 +1192832,1,375555119353901,-119.5942167,37.93204167 +1191655,1,375633121333301,-121.5592806,37.94248056 +1192833,1,375708121194001,-121.327661,37.952175 +1192834,1,375712121185101,-121.3140917,37.95343889 +1191656,1,375713121174401,-121.2955,37.9537 +1192835,1,375718119430301,-119.717425,37.95486944 +1192836,1,375719119424901,-119.7135,37.9553972 +1192837,1,375722121173601,-121.2934,37.956175 +1191657,1,375930121305501,-121.51535,37.9915611 +1191658,1,375930122213101,-122.3586333,37.9917472 +1191659,1,380013121314401,-121.5288389,38.00363889 +1191660,1,380034121431201,-121.7199194,38.0094 +1191661,1,380042122175201,-122.2977556,38.0116111 +1191662,1,380116121421501,-121.7042806,38.02103889 +1191663,1,380118121440701,-121.735161,38.0217 +1191664,1,380126121485801,-121.816111,38.0238611 +1191665,1,380131121445401,-121.7482806,38.0252 +1191666,1,380138121484001,-121.8112389,38.02723889 +1191667,1,380145121350001,-121.5833806,38.02918889 +1191668,1,380146121451401,-121.754011,38.0293611 +1191669,1,380206121495201,-121.8313194,38.03501944 +1191670,1,380208121525601,-121.8821278,38.0354861 +1191671,1,380209121463701,-121.7769306,38.03581944 +1191672,1,380220121341101,-121.5696806,38.03891944 +1191673,1,380221121432801,-121.7245389,38.03908889 +1191674,1,380228121492901,-121.824611,38.04106944 +1191675,1,380236121423301,-121.7092889,38.04345 +1191676,1,380238121573901,-121.960725,38.043775 +1191677,1,380242121480801,-121.8021389,38.04498889 +1191678,1,380252121474201,-121.794961,38.04786944 +1191679,1,380300121374901,-121.6302,38.05003056 +1191680,1,380306121380301,-121.6341889,38.05158889 +1191681,1,380306121413001,-121.6915806,38.0516111 +1191682,1,380322121482601,-121.807261,38.05608056 +1191683,1,380325121363101,-121.60865,38.05691944 +1191684,1,380333121404001,-121.677861,38.05903889 +1191685,1,380333121492001,-121.8222389,38.0592611 +1191686,1,380336122123001,-122.2083333,38.06 +1192838,1,380341121551901,-121.921961,38.06143056 +1191687,1,380342121370901,-121.6192694,38.06156944 +1191688,1,380344121503501,-121.8430306,38.06216944 +1191689,1,380347121334001,-121.5610306,38.06306944 +1191690,1,380357121473601,-121.7934194,38.06591944 +1191691,1,380358122134801,-122.229936,38.0661472 +1192839,1,380406122000001,-122.000011,38.06845 +1191692,1,380415121501501,-121.837461,38.0707611 +1192840,1,380421121562101,-121.9392,38.0724 +1191693,1,380428121462201,-121.7728806,38.07438889 +1191694,1,380441121405701,-121.682561,38.07803056 +1191695,1,380504121423601,-121.7100389,38.08438056 +1191696,1,380550121322801,-121.5411139,38.09735278 +1191697,1,380600121430801,-121.7190306,38.10005 +1191698,1,380615121353501,-121.593,38.1042 +1191699,1,380635121423601,-121.71,38.1096111 +1191700,1,380812121411201,-121.6866889,38.13653056 +1192841,1,381124122012301,-122.0231194,38.19008056 +1192842,1,381257122020501,-122.0347194,38.2157 +1192843,1,381314122015401,-122.0316,38.2206611 +1192844,1,381314122023801,-122.0439889,38.2206583 +1192845,1,381335122012501,-122.0235806,38.22643889 +1192846,1,381427121305401,-121.515836,38.2408583 +1192847,1,381435121410201,-121.684,38.243 +1191701,1,381436121304901,-121.5136222,38.24321944 +1191702,1,381459120501601,-120.837711,38.24980278 +1191703,1,381548120505201,-120.8478139,38.2634361 +1191704,1,381601120501401,-120.837261,38.2670083 +1191705,1,381638120491501,-120.8208,38.27710278 +1191706,1,381648120513201,-120.8590139,38.2800972 +1192848,1,381717121393201,-121.659,38.2881 +1191707,1,381719120481301,-120.8037167,38.2886611 +1192849,1,381738121413101,-121.692,38.2938 +1192850,1,381920121413501,-121.693,38.3222 +1192851,1,381945121484901,-121.8135,38.3292222 +1191708,1,383840121595001,-121.9972778,38.6445833 +1191709,1,384052121403701,-121.676875,38.68123889 +1192852,1,384101121404201,-121.6782472,38.68359444 +1191710,1,384255121074201,-121.1282722,38.71514167 +1191711,1,384357121063601,-121.1101,38.73257778 +1191712,1,384420121091101,-121.1530389,38.73876944 +1191713,1,384521121074101,-121.128025,38.7557722 +1191714,1,384524121040101,-121.0670806,38.7566111 +1191715,1,384857121054301,-121.0952778,38.8158333 +1192853,1,385601120004401,-120.0122222,38.9338611 +1192854,1,385623120010201,-120.0172222,38.93991667 +1192855,1,385628120033001,-120.0583333,38.94116667 +1192856,1,385630120000401,-120.001111,38.94169444 +1192857,1,385633120032701,-120.0575,38.9425833 +1191716,1,385638122533201,-122.8922694,38.9438 +1192858,1,385641120010101,-120.0169444,38.94488889 +1191717,1,385644122542201,-122.9062,38.9455 +1192859,1,385648120032001,-120.0555556,38.94666667 +1191718,1,385653122540901,-122.9025389,38.94798056 +1191719,1,385656122381701,-122.637986,38.94875556 +1192860,1,385700120000501,-120.0013889,38.95005556 +1192861,1,385703120000501,-120.0013889,38.9508333 +1191720,1,385908122491101,-122.8196306,38.98555 +1191721,1,390015122394801,-122.6634306,39.0041 +1191722,1,390015122395001,-122.6638194,39.00405 +1191723,1,390021122400501,-122.6679694,39.00578889 +1191724,1,390109122402701,-122.67415,39.01918889 +1191725,1,390243122544701,-122.9129389,39.04533056 +1191726,1,390924122553201,-122.92565,39.15669444 +1191727,1,390924122553501,-122.9264,39.1566611 +1191728,1,390943122543801,-122.9106778,39.162 +1191729,1,390950122595101,-122.9975,39.164 +1192862,1,391008120083002,-120.1416667,39.1690833 +1191730,1,391027123004801,-123.0134,39.1743 +1191731,1,393209121204701,-121.3464833,39.5359611 +1191732,1,393256121283401,-121.4759972,39.54879444 +1191733,1,393258121261701,-121.4381333,39.5493833 +1191734,1,393419121274501,-121.4623722,39.5719 +1191735,1,393431121234701,-121.396425,39.57527778 +1191736,1,393655121292301,-121.4898444,39.615375 +1191737,1,401157121052801,-121.0911306,40.19917778 +1191738,1,401320121092301,-121.1564694,40.2221611 +1191739,1,401350121062401,-121.106661,40.2304833 +1191740,1,401524121063301,-121.1092972,40.2566222 +1191741,1,401529121112001,-121.188975,40.25791944 +1191742,1,401717121112601,-121.1904389,40.28795278 +1191743,1,401724120215400,-120.3650278,40.2898611 +1192863,1,403748122283202,-122.4755639,40.63005278 +1192864,1,403749122283401,-122.476211,40.63014444 +1191744,1,404034120394400,-120.6622778,40.6759722 +1191745,1,07105932,-104.8515278,38.67885 +1192865,1,09085160,-107.4172222,39.56527778 +1191746,1,382802107065401,-107.1150472,38.46713889 +1191747,1,382840107044401,-107.0788861,38.47771389 +1191748,1,382848107041001,-107.0694861,38.4799583 +1191749,1,382850107054901,-107.0968222,38.48060278 +1191750,1,382906107043701,-107.077,38.48495278 +1192866,1,384522104433101,-104.7253,38.7560111 +1191751,1,385800104513101,-104.8586333,38.96673889 +1192867,1,390442106203001,-106.3415833,39.0783333 +1191752,1,390621108350801,-108.58565,39.10581389 +1191753,1,390622108355401,-108.5984556,39.10616667 +1191754,1,390622108362801,-108.607725,39.10613056 +1191755,1,390623108350901,-108.5858944,39.10628889 +1191756,1,390649108360801,-108.6021833,39.11354444 +1191757,1,390809108413101,-108.6918444,39.1357611 +1191758,1,391022108395001,-108.6638222,39.17270556 +1192868,1,391202106211501,-106.3540556,39.2005833 +1192869,1,391208106211101,-106.3531389,39.2021111 +1192870,1,391208106211601,-106.3543889,39.20219444 +1192871,1,391210106212201,-106.3559722,39.20277778 +1192872,1,391215106212901,-106.3581389,39.20405556 +1192873,1,391240106223801,-106.3771944,39.21119444 +1192874,1,391320106224501,-106.3791667,39.22219444 +1192875,1,391322106225001,-106.3805556,39.2228333 +1192876,1,391323106224401,-106.3788056,39.22305556 +1192877,1,391407106225401,-106.3816944,39.2353611 +1192878,1,391427106225601,-106.3821111,39.24088889 +1192879,1,391429106225701,-106.3824167,39.2413611 +1192880,1,391430106225501,-106.382,39.2417222 +1192881,1,391431106225401,-106.3816389,39.24191667 +1192882,1,391433106225401,-106.3815278,39.2423611 +1192883,1,391434106225101,-106.3809444,39.24266667 +1192884,1,391435106225001,-106.3806667,39.24291667 +1192885,1,391436106225001,-106.3806111,39.24319444 +1192886,1,391436106225101,-106.3806944,39.2433611 +1192887,1,391439106224901,-106.38025,39.24416667 +1192888,1,391443106224701,-106.37975,39.24525 +1192889,1,391444106224701,-106.3796667,39.24555556 +1192890,1,391445106224501,-106.3790833,39.24580556 +1192891,1,391449106224201,-106.3784167,39.24691667 +1192892,1,391453106224101,-106.3780278,39.2481111 +1192893,1,391454106223901,-106.3776389,39.24838889 +1192894,1,391454106223902,-106.3776667,39.24841667 +1192895,1,391454106224001,-106.3778056,39.24838889 +1192896,1,391454106224101,-106.3779444,39.2482222 +1192897,1,391455106223901,-106.3775556,39.24855556 +1192898,1,391456106223801,-106.3772778,39.2488611 +1192899,1,391456106223901,-106.3773889,39.24877778 +1192900,1,391457106223701,-106.3770556,39.24941667 +1192901,1,391458106223701,-106.3769722,39.24944444 +1192902,1,391458106223801,-106.3771806,39.24933056 +1192903,1,391458106223802,-106.3770944,39.24955278 +1192904,1,391459106223801,-106.3771111,39.24977778 +1192905,1,391459106224401,-106.379,39.24973889 +1192906,1,391459106224501,-106.3792111,39.2496111 +1192907,1,391459106224502,-106.3791806,39.249725 +1192908,1,391459106224503,-106.3790833,39.2497333 +1192909,1,391500106223601,-106.3767806,39.25005 +1192910,1,391500106223701,-106.3768889,39.24995 +1192911,1,391500106224401,-106.3788611,39.24985 +1192912,1,391501106223601,-106.3767222,39.25027778 +1192913,1,391502106223501,-106.3763333,39.25066667 +1192914,1,391504106223201,-106.3756389,39.2510833 +1191759,1,393239105020001,-105.0333333,39.54425 +1192915,1,393832106210401,-106.3512111,39.64216944 +1192916,1,400341105302901,-105.5079528,40.06151667 +1192917,1,400352105304301,-105.5118194,40.06444444 +1192918,1,01477405,-75.4705611,39.80416944 +1192919,1,01478005,-75.7055611,39.6355611 +1192920,1,01481340,-75.57,39.81693889 +1192921,1,014847175,-75.6176944,38.6863611 +1192922,1,383234075045201,-75.0811667,38.54277778 +1192923,1,383309075051101,-75.0864444,38.55241667 +1191762,1,391058075324201,-75.545,39.18291667 +1191763,1,01649025,-77.0250556,38.8755833 +1192924,1,01651760,-76.95527778,38.90916667 +1192925,1,02232900,-81.10941389,28.27543333 +1192926,1,02261400,-81.1398111,28.27562778 +1192927,1,02262499,-81.22315,28.34526944 +1192928,1,02272701,-81.0341667,27.34194444 +1192929,1,02272702,-81.0352194,27.3351111 +1192930,1,02291195,-81.6064667,26.0039361 +1192931,1,02299729,-82.4356806,27.13763056 +1191764,1,02301319,-82.1159806,27.85067778 +1191765,1,02301405,-82.1892194,27.89717778 +1192932,1,02310667,-82.6083611,28.70023333 +1192933,1,02310687,-82.5953833,28.82298333 +1191766,1,02313095,-82.4354444,29.0971111 +1192934,1,02313097,-82.4267806,29.08868056 +1192935,1,252653080273001,-80.45838889,25.44796389 +1192936,1,252654080220201,-80.3673,25.4484 +1192937,1,253256080205103,-80.3476,25.5488 +1192938,1,254016080170201,-80.2839,25.671 +1191767,1,254645080394401,-80.66231389,25.77917778 +1191768,1,254711080392601,-80.657225,25.7862722 +1192939,1,254838080155301,-80.2648,25.8106 +1192940,1,254929080170101,-80.2836,25.8246 +1191769,1,255022080370201,-80.6173,25.839475 +1191770,1,255035080365201,-80.614525,25.8431861 +1192941,1,255242080110901,-80.1857,25.8783 +1191771,1,304202086580900,-86.9691944,30.7006111 +1191772,1,304251086583400,-86.9759722,30.71405556 +1191773,1,304358086585700,-86.9825,30.73275 +1191774,1,304437086590300,-86.9840556,30.7437222 +1191775,1,304460086592600,-86.9904722,30.7498611 +1191776,1,02335772,-84.3619444,34.0021111 +1191777,1,02387568,-84.9493472,34.37344444 +1191778,1,16643500,-156.668111,20.85966667 +1192942,1,200132155395601,-155.6656583,20.02564722 +1191779,1,212656158112501,-158.1902083,21.448944439999998 +1191780,1,212703158110601,-158.1849139,21.45094167 +1191781,1,215247159280901,-159.4691194,21.8798 +1191782,1,215403159275001,-159.4638889,21.90083333 +1191783,1,215708159395801,-159.666111,21.95222222 +1191784,1,220242159201001,-159.336111,22.045 +1191785,1,221212159303501,-159.5097222,22.20333333 +1191786,1,221215159305001,-159.5138889,22.20416667 +1191787,1,221249159294301,-159.4952778,22.2136111 +1191788,1,221250159294601,-159.496111,22.21388889 +1192943,1,882024060600320,-155.2839917,19.40753889 +1192944,1,88240606311,-158.1000139,21.59265556 +1192945,1,12413795,-116.4678389,47.5375083 +1191789,1,13070199,-111.9453333,42.87718889 +1191790,1,13070200,-111.9453139,42.87686944 +1191791,1,13074400,-112.2520694,42.7918333 +1191792,1,13091605,-114.5051833,42.61818056 +1191793,1,13125950,-113.6753583,43.9530472 +1191794,1,13153505,-114.9036444,42.86082778 +1191795,1,13210045,-116.5587056,43.68175556 +1191796,1,13290012,-116.6285667,45.12396667 +1191797,1,13292900,-116.7919722,45.85488889 +1191798,1,13306010,-114.051011,45.3875111 +1192946,1,13310875,-115.341561,44.89416667 +1191799,1,13311150,-115.2795556,44.9222222 +1191800,1,13311155,-115.2837222,44.92980556 +1191801,1,13313150,-115.6615556,44.9628333 +1191802,1,13313750,-115.6921944,45.03166667 +1191803,1,13315175,-116.3010833,45.4156111 +1191804,1,13315750,-116.1685306,44.9618 +1191805,1,13315755,-116.1704389,44.9698194 +1191806,1,13315760,-116.2051389,44.95963889 +1191807,1,13315765,-116.2094889,45.01358056 +1192947,1,13338275,-115.98334439999999,46.05116389 +1192948,1,13338745,-116.5109444,46.1283361 +1192949,1,13338775,-116.3445778,46.142075 +1192950,1,13338945,-116.0696833,46.1967944 +1192951,1,13340785,-116.711386,46.49794167 +1192952,1,13341135,-116.4160972,46.4667694 +1192953,1,13341305,-116.5516167,46.5061444 +1192954,1,13341310,-116.5872,46.5194611 +1192955,1,13341975,-116.7357194,46.3671611 +1191808,1,13344350,-116.9249722,46.1720833 +1191809,1,420446111183201,-111.3087778,42.07952778 +1191810,1,421309111174401,-111.2956389,42.21925 +1191811,1,4253291113457,-111.5825,42.89138889 +1191812,1,4256461155734,-115.9594444,42.9461111 +1191813,1,4316261110821,-111.1391667,43.27388889 +1191814,1,4333011164026,-116.6738889,43.55027778 +1191815,1,4424251113041,-111.5113889,44.40694444 +1191816,1,4435361160624,-116.1066667,44.5933333 +1191817,1,4439131112406,-111.4016667,44.6536111 +1191818,1,4738461164603,-116.7675,47.6461111 +1191819,1,4740271164330,-116.725,47.67416667 +1191820,1,4745501164238,-116.7105556,47.76388889 +1191821,1,03343350,-88.1692222,39.9526111 +1192956,1,05568703,-89.9047778,40.3263333 +1192957,1,05578330,-88.8976917,40.12121944 +1192958,1,05578360,-88.9237306,40.10988889 +1191822,1,05594070,-89.6288056,38.6158611 +1191823,1,05595952,-88.9605556,38.02702778 +1191824,1,400335090251301,-90.4202,40.05978056 +1191825,1,400923090120401,-90.2010833,40.15625 +1191826,1,403636088301201,-88.5035306,40.61001389 +1191827,1,403640088251202,-88.4233861,40.61329167 +1191828,1,403701088295503,-88.5071611,40.61725278 +1191829,1,403712088280302,-88.4680722,40.61994444 +1191830,1,403808088294702,-88.4970972,40.6356722 +1191831,1,403857088265401,-88.4484333,40.64933056 +1191832,1,403857088265402,-88.4483333,40.64916667 +1191833,1,403916088333501,-88.559825,40.6546111 +1191834,1,403921088284201,-88.4785917,40.6560361 +1191835,1,403921088285903,-88.4807583,40.65603056 +1191836,1,403921088285904,-88.4830556,40.6558333 +1191837,1,404014088343301,-88.5759056,40.6707861 +1191838,1,404017088325201,-88.5479028,40.67160556 +1191839,1,404038088332002,-88.5544333,40.67800278 +1191840,1,404137088320103,-88.5352222,40.69599444 +1191841,1,404137088331703,-88.55031389,40.69731667 +1191842,1,404137088331704,-88.5502778,40.6972222 +1191843,1,404156088324202,-88.5436778,40.697925 +1191844,1,404156088324204,-88.5405528,40.6997 +1191845,1,404201088305202,-88.5140167,40.70073056 +1191846,1,404238088321605,-88.53825,40.70550278 +1191847,1,404238088321606,-88.5380556,40.70527778 +1191848,1,404247088323605,-88.54108889,40.71236944 +1191849,1,404259088322803,-88.5400278,40.71644167 +1191850,1,404259088322804,-88.5411111,40.71638889 +1191851,1,404259088322805,-88.54,40.71638889 +1191852,1,404324088314701,-88.52998889,40.723425 +1191853,1,404324088314703,-88.5303861,40.72291667 +1192959,1,404721091043701,-91.0769167,40.78902778 +1192960,1,412341088161001,-88.2693611,41.3948333 +1191854,1,412924087315901,-87.533175,41.48988056 +1191855,1,412937087314401,-87.5288806,41.49367778 +1192961,1,412943087322601,-87.5405694,41.49519167 +1192962,1,412948087322501,-87.5402833,41.496675 +1192963,1,412948087323401,-87.54291389,41.4968333 +1192964,1,412952087453701,-87.7603556,41.49769444 +1192965,1,413015087322801,-87.5411694,41.5041333 +1192966,1,413135087350901,-87.5859667,41.5263833 +1191856,1,413359087450401,-87.7512361,41.5663222 +1191857,1,413411087510901,-87.8526083,41.56977778 +1191858,1,413435087511701,-87.8546583,41.57646667 +1192967,1,413541087445201,-87.7477972,41.5945861 +1191859,1,413555087433301,-87.7259167,41.5985583 +1192968,1,413613087520901,-87.8691611,41.6036583 +1191860,1,413826087325101,-87.5475806,41.64061667 +1191861,1,413828087331001,-87.552675,41.64097778 +1191862,1,413832087334301,-87.5621694,41.6424 +1192969,1,413846087340101,-87.5669694,41.646025 +1191863,1,413908087403101,-87.6754694,41.65248056 +1191864,1,413909087392101,-87.65595,41.65268056 +1191865,1,413913087545301,-87.9147472,41.6537222 +1191866,1,413922087542601,-87.9071611,41.6560833 +1192970,1,413924087335501,-87.5652778,41.6567083 +1191867,1,413936087545001,-87.9138556,41.6600111 +1191868,1,413937087552401,-87.9233306,41.660225 +1191869,1,413944087370901,-87.61923889,41.6624611 +1191870,1,413947087543101,-87.9086194,41.662975 +1192971,1,414004087551801,-87.9216528,41.66766944 +1191871,1,414029087351601,-87.58783889,41.67473889 +1192972,1,414044087334501,-87.5625333,41.67888889 +1192973,1,414101087313701,-87.5269583,41.6834722 +1192974,1,414106087595601,-87.9989778,41.684975 +1192975,1,414123087540101,-87.9004,41.6896333 +1191872,1,414124087341801,-87.5717111,41.689925 +1192976,1,414128087345701,-87.5826028,41.69119444 +1191873,1,414136087335701,-87.5658694,41.69333056 +1192977,1,414222087553301,-87.9258333,41.7061 +1192978,1,414310087543801,-87.910475,41.7194472 +1191874,1,414319087323701,-87.5435194,41.72201944 +1191875,1,414605087420901,-87.70258889,41.76813889 +1191876,1,414638087342601,-87.5737583,41.77731389 +1191877,1,414641087343901,-87.5774333,41.77804444 +1191878,1,414705087350201,-87.5837806,41.78480556 +1191879,1,414707087345301,-87.5814028,41.78525278 +1191880,1,414716087344601,-87.5793306,41.78775 +1191881,1,414719087364001,-87.6110556,41.78851667 +1191882,1,414722087345901,-87.5830083,41.78940556 +1191883,1,414747087392701,-87.6574833,41.79634167 +1192979,1,414908087484901,-87.8135361,41.819 +1191884,1,414931087404101,-87.6780556,41.82534167 +1191885,1,414948087304401,-87.5123694,41.83021944 +1191886,1,415035087395101,-87.66433889,41.84326944 +1191887,1,415149087415401,-87.6983972,41.86353056 +1191888,1,415232087460201,-87.76711389,41.87569167 +1191889,1,415259087425901,-87.7163778,41.8830583 +1191890,1,415300087353101,-87.5918778,41.8835111 +1191891,1,415322087362801,-87.60776389,41.8894722 +1192980,1,415334087493801,-87.82733889,41.8928861 +1191892,1,415423087420101,-87.7003583,41.90648889 +1191893,1,415502087375701,-87.6323611,41.91734167 +1191894,1,415538087375701,-87.6325944,41.92723056 +1192981,1,415724087502301,-87.83975,41.95676389 +1192982,1,420033088055001,-88.0972667,42.00928889 +1192983,1,420045088092001,-88.1556444,42.0124083 +1191895,1,420116088011401,-88.0204194,42.02115 +1191896,1,420129088003301,-88.0091167,42.0247833 +1192984,1,420141088060901,-88.1024722,42.02814167 +1192985,1,420201088094101,-88.16148889,42.03373056 +1192986,1,420203088135701,-88.2326056,42.03418056 +1191897,1,420204087423601,-87.7099444,42.0343333 +1191898,1,420215088010001,-88.016725,42.03743889 +1192987,1,420242088074501,-88.1292278,42.0451361 +1192988,1,420254088080101,-88.1334972,42.04830556 +1192989,1,420321088084801,-88.1465278,42.05577778 +1192990,1,420413088052301,-88.0897583,42.0703861 +1192991,1,420417088063301,-88.1092917,42.0715222 +1191899,1,420430087410801,-87.6855,42.07491667 +1192992,1,420441088036001,-88.06658889,42.07795 +1192993,1,420450088054201,-88.0951361,42.0806583 +1192994,1,420453088121901,-88.20518889,42.08130278 +1192995,1,420460088093801,-88.16046389,42.08323056 +1192996,1,420510088124101,-88.2114306,42.08601944 +1192997,1,420516088041001,-88.06945,42.0877861 +1192998,1,420519088093801,-88.1606278,42.0886611 +1192999,1,420522088130601,-88.2184056,42.089575 +1191900,1,420529088064601,-88.11286389,42.0915083 +1193000,1,420533087481001,-87.80286389,42.0925 +1191901,1,420533087490401,-87.81786389,42.0925111 +1193001,1,420548088122601,-88.2073056,42.09666667 +1191902,1,420607088062701,-88.1074722,42.10194444 +1191903,1,420615087454401,-87.7622056,42.10426667 +1191904,1,420630088090901,-88.1526,42.10838056 +1191905,1,420637087455001,-87.76393889,42.11031944 +1191906,1,420641088091201,-88.1532056,42.11135556 +1193002,1,420643088033701,-88.0602278,42.11204167 +1193003,1,420645088074701,-88.1297694,42.11249167 +1193004,1,420647088032501,-88.0568111,42.1130833 +1191907,1,420648087461201,-87.7701222,42.113325 +1191908,1,420651088091201,-88.1534361,42.11425278 +1193005,1,420657087532101,-87.8891778,42.11590278 +1191909,1,420707087461001,-87.7693667,42.1186111 +1193006,1,420709088094801,-88.163325,42.1190972 +1193007,1,420718087462201,-87.7727028,42.12175556 +1193008,1,420729087464001,-87.7777556,42.12470278 +1191910,1,420733087462701,-87.7740278,42.1257472 +1193009,1,420736088032401,-88.056788890000007,42.12676944 +1193010,1,420737088023001,-88.0417111,42.12684167 +1191911,1,420744087463801,-87.7773278,42.1289861 +1193011,1,420756088115301,-88.1980528,42.13234167 +1191912,1,420758087530001,-87.8833722,42.13274167 +1193012,1,420811088062501,-88.106975,42.13643056 +1191913,1,420829087471101,-87.78625,42.1413361 +1193013,1,420830087471401,-87.7871111,42.1417972 +1193014,1,420837087471601,-87.7878,42.14354444 +1193015,1,420840087540901,-87.9023611,42.14430556 +1193016,1,420842087472401,-87.7898806,42.14491667 +1193017,1,420845087471201,-87.7866556,42.14576667 +1193018,1,420846087471901,-87.7886556,42.14597778 +1193019,1,420848087473201,-87.7921167,42.14671389 +1193020,1,420852087471101,-87.78641389,42.14786944 +1193021,1,420859087473001,-87.79163889,42.1498333 +1191914,1,05516663,-86.4541667,41.2722222 +1191915,1,402443087021100,-87.0364004,40.41197987 +1191916,1,403637086062300,-86.10638889,40.61027778 +1191917,1,40385086101100,-86.2031361,40.65128056 +1191918,1,403858086101100,-86.1698444,40.64958889 +1191919,1,403905086121400,-86.20388889,40.65138889 +1191920,1,404018086064000,-86.1111111,40.67166667 +1191921,1,404036086100000,-86.1667306,40.67655278 +1191922,1,404042086121400,-86.2039556,40.6784333 +1191923,1,404133086082000,-86.13875,40.6925 +1191924,1,05389015,-91.2201944,43.09566667 +1191925,1,415143091431601,-91.7211111,41.86194444 +1191926,1,373559097165000,-97.2805556,37.5997222 +1191927,1,373622097153900,-97.2608333,37.6061111 +1191928,1,375331097285301,-97.4817094,37.8919562 +1193022,1,384739094421200,-94.7034111,38.7943 +1193023,1,384755094411500,-94.6876611,38.79875 +1193024,1,384931094432100,-94.7226694,38.82548889 +1193025,1,385239094430100,-94.7168806,38.87756944 +1193026,1,385312094402000,-94.6723611,38.88685 +1193027,1,385357094391700,-94.6547806,38.89933889 +1193028,1,385500094422600,-94.7073389,38.91693056 +1193029,1,385559094431000,-94.7196111,38.93328056 +1193030,1,390024094374800,-94.6300889,39.0067611 +1191929,1,391305097001800,-97.0050972,39.2180083 +1191930,1,391358096584700,-96.9798,39.23286944 +1191931,1,391417096594700,-96.9963778,39.23811944 +1193031,1,391419097001500,-97.0041444,39.2384972 +1191932,1,391456096593800,-96.9940278,39.2490083 +1193032,1,391503096594500,-96.9957333,39.25090556 +1191933,1,391519097002900,-97.00815,39.2552972 +1193033,1,391529097003300,-97.0091806,39.25811667 +1191934,1,99999999,-85.5716667,38.22138889 +1191935,1,07344405,-93.7551583,32.6089 +1191936,1,07348490,-93.7509722,32.51919444 +1191937,1,07348505,-93.6984167,32.49233333 +1191938,1,07352470,-93.1883333,32.2972222 +1191939,1,07353820,-93.1091944,31.7284722 +1191940,1,07355493,-92.4758611,31.30752778 +1191941,1,07369085,-92.0273611,32.19491667 +1191942,1,07369345,-91.8187222,31.76725 +1193034,1,07369860,-91.4055,32.62063889 +1191943,1,07370111,-91.5925,32.09275 +1193035,1,07373210,-92.2969722,31.38408333 +1191945,1,073732645,-91.9918889,31.574 +1193036,1,07373285,-91.6775,31.1968611 +1191946,1,0737775101,-91.0986667,30.63501944 +1191947,1,0737775102,-91.0994611,30.63333889 +1191948,1,0737775103,-91.1010472,30.63221389 +1191949,1,07383360,-92.0094722,31.14191667 +1193037,1,08012450,-91.5458611,31.72380556 +1191950,1,08012850,-92.8284722,31.24119444 +1191951,1,08013710,-93.0715278,30.89491667 +1191952,1,08013970,-92.8298889,30.8896111 +1191953,1,08014990,-93.0436667,30.68475 +1191954,1,08015620,-93.0941111,30.4676111 +1191955,1,08015910,-93.1889167,30.2861111 +1191956,1,08016910,-93.4246111,30.4231111 +1191957,1,08017028,-93.2488333,30.29666667 +1191958,1,302144090052401,-90.0902219,30.36251808 +1191959,1,01585149,-76.3594722,39.3521111 +1191960,1,0158540095,-76.4041667,39.2503611 +1191961,1,01594441,-76.69488889,38.9468333 +1193038,1,01640152,-77.15888889,39.53308056 +1191963,1,01651003,-76.9562222,38.9489722 +1191964,1,384733076515401,-76.8649167,38.79238889 +1193039,1,882024060600312,-76.34463889,39.48552778 +1193040,1,01107600,-70.9413111,41.8331472 +1193041,1,412116070433001,-70.72454798,41.35466036 +1193042,1,412238070403701,-70.6764962,41.3773988 +1193043,1,412321070401701,-70.6709015,41.38923199 +1193044,1,412348070421801,-70.7047192,41.39682929 +1193045,1,412407070403901,-70.67710717,41.4020902 +1193046,1,412630070400301,-70.6670676,41.44182868 +1191966,1,413827070305002,-70.51393889,41.64090556 +1193047,1,414851070565701,-70.94920278,41.8141861 +1193048,1,414945070560301,-70.9343972,41.82917778 +1193049,1,415026070563603,-70.9433333,41.84055556 +1193050,1,422734071164301,-71.27871389,42.4593583 +1193051,1,422800071163702,-71.2769167,42.4666833 +1193052,1,422805071130000,-71.3082806,42.4681722 +1193053,1,422832071154701,-71.2631444,42.47555 +1191967,1,422848071155000,-71.2637556,42.4799611 +1191968,1,422848071155100,-71.2641306,42.47993889 +1191969,1,422855071155500,-71.26527778,42.48193889 +1193054,1,422858071171301,-71.2870306,42.48283056 +1193055,1,422953071152201,-71.25613889,42.4979583 +1193056,1,423223070531001,-70.88615,42.53975 +1193057,1,040967671,-85.3596333,41.89741389 +1191970,1,040970647,-85.4572167,42.01109444 +1191971,1,04097349,-85.7181861,42.02440556 +1193058,1,04101792,-86.204525,41.91396667 +1191972,1,04101825,-86.27086389,41.86061389 +1191973,1,041027907,-84.6905167,42.0436 +1193059,1,041027918,-84.7098833,42.08907778 +1193060,1,04108895,-84.3995972,42.102275 +1193061,1,04108896,-84.3931306,42.11151667 +1193062,1,041088962,-84.3962,42.1205722 +1193063,1,04108897,-84.3636694,42.1177611 +1193064,1,041088976,-84.3545056,42.115466670000004 +1193065,1,041088978,-84.3506806,42.11560278 +1193066,1,041088987,-84.3893417,42.13668889 +1193067,1,04120196,-86.06643889,43.1743361 +1191974,1,04145783,-84.17038889,43.4901833 +1193068,1,04154114,-84.6068944,43.5681333 +1193069,1,04154120,-84.6077944,43.57149167 +1193070,1,04160062,-82.5134278,43.0235111 +1193071,1,041600633,-82.5060778,43.03827778 +1193072,1,04165701,-82.9731667,42.35521389 +1193073,1,421337083074201,-83.12926389,42.22688889 +1191976,1,05319150,-94.4198611,44.03938889 +1191977,1,05376400,-92.0328028,44.00339444 +1191978,1,05383550,-92.4779667,43.87004444 +1191979,1,435838094383901,-94.6441028,43.97725 +1191980,1,441117093484101,-93.8114889,44.18790556 +1191981,1,441140093480001,-93.8000056,44.1943222 +1191982,1,442423096211201,-96.35325,44.4064 +1191983,1,450601093094301,-93.1620472,45.1004 +1191984,1,452400094182701,-94.3075222,45.40005 +1191985,1,461002093333301,-93.5591111,46.16709167 +1191986,1,461222093432601,-93.7239833,46.20623889 +1191987,1,461850093420801,-93.7020833,46.3137944 +1191988,1,465734094355801,-94.5993917,46.9593111 +1191989,1,465759095071601,-95.1210889,46.96636667 +1191990,1,465813094340901,-94.5690417,46.97019167 +1191991,1,474924090422101,-90.7058972,47.82321667 +1191992,1,475933090103901,-90.1774361,47.99255 +1191993,1,475950090111201,-90.1865833,47.99734167 +1191994,1,480713094354701,-94.5964806,48.1202611 +1191995,1,481034094375401,-94.6317556,48.17605556 +1191996,1,481614092281501,-92.4708333,48.27055556 +1191997,1,482006092282601,-92.4738889,48.335 +1191998,1,482210092323101,-92.5419444,48.3694444 +1191999,1,482415092291001,-92.4861111,48.40416667 +1192000,1,482455092404301,-92.6786111,48.41527778 +1192001,1,482506092474801,-92.7966667,48.4183333 +1192002,1,482603092453001,-92.7583333,48.43416667 +1192003,1,482610092504901,-92.8469444,48.4361111 +1192004,1,482641093013901,-93.0275,48.4447222 +1192005,1,483013092433201,-92.7255556,48.5036111 +1193074,1,483142092465201,-92.7813237,48.52831885 +1192006,1,483206092455001,-92.7638889,48.535 +1192007,1,483225092520801,-92.8688889,48.54027778 +1192008,1,483501093093601,-93.16,48.5836111 +1192009,1,483520093092701,-93.1575,48.58888889 +1192010,1,483534093091801,-93.155,48.59277778 +1192011,1,483541093014101,-93.0280556,48.5947222 +1192012,1,483556093061301,-93.1036111,48.59888889 +1192013,1,483645093075801,-93.1327778,48.6125 +1193075,1,02487630,-89.9625833,31.90068889 +1192014,1,07292465,-91.0919444,31.31777778 +1192015,1,06893796,-94.4398333,38.92766667 +1193076,1,380220094312200,-94.5230389,39.03903889 +1193077,1,385506094342300,-94.5732194,38.91838056 +1193078,1,385632094340000,-94.5668111,38.94241944 +1193079,1,385714094340800,-94.5691194,38.954 +1193080,1,385749094332500,-94.5570389,38.96366944 +1193081,1,385841094322100,-94.5392889,38.97828056 +1193082,1,385952094311700,-94.521475,38.997775 +1193083,1,390443094301200,-94.5034611,39.07885 +1192016,1,402216094473301,-94.7925278,40.3711111 +1193084,1,402217094473201,-94.7922778,40.3716111 +1192017,1,402412094491201,-94.8199444,40.4033333 +1192018,1,402417094471201,-94.7866667,40.4047222 +1192019,1,402552094462401,-94.7731944,40.4311111 +1192020,1,402552094465001,-94.7805833,40.4311111 +1192021,1,402552094470001,-94.7833611,40.4311111 +1193085,1,06096001,-112.6254444,48.25175 +1193086,1,06154428,-108.5316125,48.0218595 +1193087,1,06192978,-110.4919472,46.167125 +1193088,1,06666667,-112.0425425,46.61655469 +1192022,1,12323749,-112.7811667,46.17756389 +1192023,1,451846107553203,-107.9255444,45.31282778 +1192024,1,452259107230811,-107.3856611,45.383 +1192025,1,453139107245712,-107.4159611,45.52783056 +1192026,1,453554107272606,-107.4567306,45.59838889 +1193089,1,463938111393901,-111.6607722,46.66050278 +1193090,1,463943111414901,-111.6968897,46.661825 +1192027,1,464753110542301,-110.9063889,46.79805556 +1193091,1,470016113224701,-113.3798389,47.00458056 +1193092,1,470024113224901,-113.3804083,47.00661389 +1193093,1,470024113225001,-113.3805917,47.00661389 +1193094,1,470026113224901,-113.3801833,47.00720278 +1193095,1,470036113224901,-113.3803306,47.00986667 +1193096,1,470040113225301,-113.3814889,47.0112083 +1193097,1,470403113231801,-113.388336,47.0676361 +1193098,1,470415113230401,-113.3844667,47.07078889 +1193099,1,470419113231101,-113.3864889,47.0719 +1193100,1,470424113230501,-113.3846167,47.0732111 +1193101,1,470425113231901,-113.3885167,47.0736833 +1193102,1,470612113244801,-113.4133722,47.10328056 +1193103,1,471030113291901,-113.4885389,47.17493056 +1193104,1,471123113310401,-113.5177444,47.18977778 +1193105,1,471127113305801,-113.5160167,47.1909222 +1193106,1,471217113311201,-113.519861,47.2046194 +1193107,1,471245113311501,-113.5208083,47.2126361 +1193108,1,471250113312701,-113.5240417,47.2138444 +1193109,1,471250113312801,-113.524336,47.21393889 +1193110,1,471251113312701,-113.5242389,47.2140833 +1193111,1,471834113345401,-113.5816528,47.30932778 +1193112,1,471858113350001,-113.583361,47.3161111 +1193113,1,471921113352001,-113.5889639,47.32255278 +1193114,1,471925113352101,-113.5891694,47.3235333 +1193115,1,471926113350901,-113.585911,47.3239722 +1193116,1,471927113351401,-113.587261,47.3241972 +1192028,1,475207115253401,-115.426025,47.8687333 +1192029,1,475209115242603,-115.4071667,47.8691944 +1193117,1,475209115243401,-115.4093889,47.86916667 +1193118,1,475210115233901,-115.3942778,47.8695833 +1192030,1,475210115240801,-115.4022333,47.86953056 +1192031,1,475210115242001,-115.4055444,47.86918889 +1192032,1,475210115243101,-115.4087333,47.8693444 +1192033,1,475210115244001,-115.4111667,47.86943889 +1193119,1,475210115244201,-115.4115556,47.86930556 +1192034,1,475210115250103,-115.4168472,47.8695 +1193120,1,475210115250401,-115.4178889,47.8697222 +1192035,1,475211115241701,-115.4047972,47.86964167 +1192036,1,475211115244901,-115.4136528,47.86965556 +1192037,1,475211115245901,-115.4163889,47.8696472 +1192038,1,475211115250701,-115.4185389,47.86978056 +1193121,1,475211115251001,-115.4194444,47.8696944 +1193122,1,475212115233301,-115.3925278,47.8698611 +1192039,1,475213115251801,-115.4215389,47.8703694 +1193123,1,475230115222001,-115.3721667,47.875 +1193124,1,475232115221501,-115.3708333,47.8755 +1193125,1,475822115253601,-115.4266389,47.97288889 +1193126,1,475827115251601,-115.4211944,47.97405556 +1192040,1,481812112350001,-112.5834444,48.3034444 +1192041,1,482244112194401,-112.3289167,48.37875 +1192042,1,485921115105901,-115.183,48.9892 +1192043,1,485927115103401,-115.176,48.9908 +1192044,1,485931115101601,-115.171,48.9919 +1192045,1,485936115095401,-115.165,48.9932 +1193127,1,06767970,-99.5707222,40.6765 +1193128,1,410556095543101,-95.9086389,41.0989722 +1193129,1,411401096274801,-96.4633611,41.23366667 +1192046,1,10245979,-116.095111,39.58041667 +1192047,1,10319910,-115.7853333,40.68175 +1193130,1,364105114165601,-114.2821389,36.68475 +1193131,1,364359114131601,-114.2210556,36.733 +1193132,1,364742114041301,-114.0701667,36.795 +1193133,1,364742114042201,-114.0726944,36.79502778 +1193134,1,383145118485501,-118.8152778,38.52916667 +1192048,1,385319115410901,-115.6858333,38.8885833 +1193135,1,385835119570501,-119.9515,38.97652778 +1193136,1,385835119570701,-119.9519167,38.97644444 +1193137,1,390518119562401,-119.94,39.0885 +1192049,1,390523119544701,-119.9130472,39.08959167 +1193138,1,391418119564507,-119.9458333,39.23838889 +1192050,1,392737119040701,-119.068611,39.46027778 +1192051,1,392737119040702,-119.068611,39.46027778 +1192052,1,392737119040703,-119.068611,39.46027778 +1192053,1,392737119040704,-119.068611,39.46027778 +1192054,1,392737119040705,-119.068611,39.46027778 +1192055,1,392737119040706,-119.068611,39.46027778 +1192056,1,392737119040707,-119.068611,39.46027778 +1192057,1,392737119040708,-119.068611,39.46027778 +1192058,1,392737119040709,-119.068611,39.46027778 +1192059,1,392737119040710,-119.068611,39.46027778 +1192060,1,392737119040711,-119.068611,39.46027778 +1192061,1,392737119040712,-119.068611,39.46027778 +1192062,1,392737119040713,-119.068611,39.46027778 +1192063,1,392737119040714,-119.068611,39.46027778 +1192064,1,392737119040715,-119.068611,39.46027778 +1192065,1,392737119040716,-119.068611,39.46027778 +1192066,1,392737119040717,-119.068611,39.46027778 +1192067,1,392737119040718,-119.068611,39.46027778 +1192068,1,392737119040719,-119.068611,39.46027778 +1192069,1,392737119040720,-119.068611,39.46027778 +1192070,1,392737119040721,-119.068611,39.46027778 +1192071,1,392737119040722,-119.068611,39.46027778 +1192072,1,392737119040723,-119.068611,39.46027778 +1192073,1,392737119040724,-119.068611,39.46027778 +1192074,1,392737119040725,-119.068611,39.46027778 +1192075,1,392737119040726,-119.068611,39.46027778 +1192076,1,392737119040727,-119.068611,39.46027778 +1192077,1,392737119040728,-119.068611,39.46027778 +1192078,1,392737119040729,-119.068611,39.46027778 +1192079,1,392737119040730,-119.068611,39.46027778 +1192080,1,392737119040731,-119.068611,39.46027778 +1192081,1,392737119040732,-119.068611,39.46027778 +1192082,1,392737119040733,-119.068611,39.46027778 +1192083,1,392737119040734,-119.068611,39.46027778 +1192084,1,392737119040735,-119.068611,39.46027778 +1192085,1,392737119040736,-119.068611,39.46027778 +1192086,1,392737119040737,-119.068611,39.46027778 +1192087,1,392737119040738,-119.068611,39.46027778 +1192088,1,392737119040739,-119.068611,39.46027778 +1192089,1,392737119040740,-119.068611,39.46027778 +1192090,1,392737119040741,-119.068611,39.46027778 +1192091,1,392737119040742,-119.068611,39.46027778 +1192092,1,392737119040743,-119.068611,39.46027778 +1192093,1,392737119040744,-119.068611,39.46027778 +1192094,1,392737119040745,-119.068611,39.46027778 +1192095,1,392737119040746,-119.068611,39.46027778 +1192096,1,392737119040747,-119.068611,39.46027778 +1192097,1,392737119040748,-119.068611,39.46027778 +1192098,1,392737119040749,-119.068611,39.46027778 +1192099,1,392737119040750,-119.068611,39.46027778 +1192100,1,392737119040751,-119.068611,39.46027778 +1192101,1,392737119040752,-119.068611,39.46027778 +1192102,1,392737119040753,-119.068611,39.46027778 +1192103,1,392737119040754,-119.068611,39.46027778 +1192104,1,392737119040755,-119.068611,39.46027778 +1192105,1,392737119040756,-119.068611,39.46027778 +1192106,1,392737119040757,-119.068611,39.46027778 +1192107,1,392737119040758,-119.068611,39.46027778 +1192108,1,392737119040759,-119.068611,39.46027778 +1192109,1,392737119040760,-119.068611,39.46027778 +1192110,1,392737119040761,-119.068611,39.46027778 +1192111,1,392737119040762,-119.068611,39.46027778 +1192112,1,392737119040763,-119.068611,39.46027778 +1192113,1,392737119040764,-119.068611,39.46027778 +1192114,1,392737119040765,-119.068611,39.46027778 +1192115,1,392737119040766,-119.068611,39.46027778 +1192116,1,392737119040767,-119.068611,39.46027778 +1192117,1,392737119040768,-119.068611,39.46027778 +1192118,1,392737119040769,-119.068611,39.46027778 +1193139,1,392901118453901,-118.7608,39.48373056 +1193140,1,392923118390101,-118.6502,39.48978056 +1193141,1,392927118361101,-118.6031,39.49085 +1192119,1,392947118320201,-118.5338,39.49626667 +1193142,1,393014118382801,-118.6411,39.5039611 +1192120,1,393103118303801,-118.5105,39.51763889 +1193143,1,393201118372201,-118.6229,39.53351944 +1193144,1,393243118355501,-118.5987,39.54515 +1193145,1,400136115445001,-115.7473333,40.0266111 +1193146,1,401046115460501,-115.7514722,40.1792222 +1193147,1,401048115451301,-115.7535833,40.1798611 +1193148,1,402517115422601,-115.707111,40.4213333 +1193149,1,402759115423801,-115.7105833,40.4664722 +1193150,1,403016115434401,-115.7288889,40.50430556 +1193151,1,403019115432301,-115.7230556,40.50538889 +1193152,1,403042115552001,-115.9223333,40.5117222 +1193153,1,403148115430001,-115.7167222,40.5301111 +1193154,1,403704115434501,-115.72925,40.6178611 +1193155,1,403721115433501,-115.7265,40.62241667 +1193156,1,403746115514601,-115.8626667,40.62938889 +1193157,1,404058115503901,-115.84425,40.68263889 +1193158,1,404102116091001,-116.1528889,40.68375 +1193159,1,404104115502701,-115.840861,40.68441667 +1193160,1,404109115472301,-115.7898333,40.68591667 +1193161,1,404251116003601,-116.0100556,40.71427778 +1193162,1,404408115500201,-115.834,40.7355833 +1193163,1,404440115505301,-115.8479444,40.74438889 +1193164,1,404446115510901,-115.8524722,40.74619444 +1193165,1,404620115531601,-115.8877222,40.77213889 +1193166,1,404642115510401,-115.8510278,40.7780833 +1193167,1,404906115471901,-115.7885556,40.81819444 +1193168,1,405002115450101,-115.7503056,40.83388889 +1193169,1,405239115420201,-115.7005556,40.87741667 +1193170,1,405534115304001,-115.5112222,40.9262222 +1193171,1,411326115461701,-115.7713889,41.22380556 +1193172,1,411327115462201,-115.7726667,41.22419444 +1193173,1,411442115450501,-115.7514722,41.2449722 +1193174,1,411452115442601,-115.7406667,41.2477222 +1193175,1,411529115440501,-115.7346667,41.25805556 +1193176,1,411803115420501,-115.7013333,41.30094444 +1193177,1,411803115420701,-115.7019444,41.30088889 +1193178,1,411816115463101,-115.7751667,41.3043611 +1193179,1,411853115364201,-115.6115278,41.31477778 +1193180,1,411901115313601,-115.5267778,41.31691667 +1193181,1,412015115345001,-115.5806389,41.3374722 +1192121,1,01407639,-74.008,40.2375833 +1192122,1,0146306010,-74.8129722,40.270611100000004 +1192123,1,0146306017,-74.8118611,40.2702222 +1192124,1,400825074212801,-74.35777778,40.14027778 +1192125,1,400833074212601,-74.3572222,40.1425 +1192126,1,401345074010601,-74.0182222,40.22930556 +1192127,1,401347074005001,-74.0138611,40.22994444 +1192128,1,401352074002701,-74.0075556,40.23116667 +1192129,1,401358074013101,-74.02525,40.233 +1192130,1,405716073542301,-73.906375,40.95441389 +1192131,1,405720073543501,-73.90973889,40.9554972 +1192132,1,405722073545101,-73.9114194,40.9560361 +1193182,1,07214550,-105.3799833,36.03521667 +1193183,1,07214585,-105.3573389,36.02433056 +1193184,1,07214695,-105.4170806,36.02556944 +1193185,1,07214790,-105.4048778,35.97540278 +1193186,1,07218475,-105.4009389,35.79623889 +1193187,1,07218525,-105.3044806,35.77298889 +1193188,1,07218615,-105.4478917,35.8359222 +1193189,1,07218635,-105.4681389,35.85866944 +1193190,1,07218655,-105.4603361,35.8629333 +1193191,1,07218680,-105.4164389,35.83656667 +1193192,1,07218720,-105.3896111,35.8200722 +1192133,1,08324950,-106.6279944,35.7040722 +1192134,1,08330450,-106.3928583,35.07793889 +1192135,1,08330492,-106.4445722,35.0599861 +1192136,1,08350450,-107.1129778,35.0984583 +1193193,1,08379189,-105.4651944,35.65116667 +1193194,1,08386470,-105.7663694,33.33995 +1193195,1,08386500,-105.7414806,33.33673056 +1193196,1,08386809,-105.7218,33.36636944 +1193197,1,08386850,-105.6968306,33.36828889 +1192137,1,08386970,-105.6439111,33.34488056 +1193198,1,08387700,-105.6857,33.39868889 +1193199,1,08387710,-105.6762,33.39621944 +1193200,1,08389030,-105.4720611,33.52176944 +1193201,1,08390025,-105.2436111,33.36688056 +1192138,1,09367585,-108.5436472,36.74559167 +1193202,1,09442540,-109.0330194,33.82946944 +1192139,1,320403104284410,-104.479,32.06741667 +1192140,1,320446104282610,-104.474,32.07955556 +1193203,1,330203108111710,-108.1881389,33.03421944 +1193204,1,330442108292210,-108.4894194,33.07843889 +1193205,1,331926105391610,-105.65445,33.32398889 +1193206,1,331927105391410,-105.6538889,33.32428889 +1193207,1,331928105391910,-105.6553694,33.32463056 +1193208,1,332105105403110,-105.6752611,33.3514611 +1193209,1,332145105411510,-105.68755,33.36253889 +1192141,1,332322104240610,-104.4016667,33.38944444 +1192142,1,332350104235410,-104.3983333,33.3972222 +1193210,1,332554105275810,-105.4661306,33.43178889 +1193211,1,333112107063010,-107.1085389,33.5201611 +1193212,1,333235107061010,-107.1028111,33.54321944 +1192143,1,335214106512810,-106.8576389,33.87059167 +1192144,1,335218106522510,-106.8736111,33.8717861 +1193213,1,352228104124130,-104.2115861,35.37471389 +1192145,1,354555105314101,-105.5280556,35.76527778 +1192146,1,354602105320701,-105.5352778,35.7672222 +1192147,1,360449108322701,-108.5407667,36.08021667 +1192148,1,360650108112810,-108.1909722,36.1140111 +1193214,1,360734105303710,-105.51025,36.1262222 +1192149,1,361308108161101,-108.2698167,36.21885 +1192150,1,362123108344201,-108.5783111,36.35645556 +1193215,1,363536105290410,-105.4843333,36.5932222 +1193216,1,363550105265110,-105.44747220000001,36.5971111 +1192151,1,363929107430101,-107.7169111,36.65802778 +1192152,1,364650108413410,-108.6934211,36.7805543 +1192153,1,364936108562001,-108.9388611,36.8265611 +1192154,1,365208108462401,-108.7734611,36.86878889 +1193217,1,01297000,-73.67263889,40.96230556 +1192155,1,01302006,-73.8693611,40.90927778 +1192156,1,01302007,-73.8694444,40.90741667 +1192157,1,01303152,-73.5433611,40.90355556 +1192158,1,01328587,-73.7175694,43.21798889 +1192159,1,01358600,-73.6755,42.72180556 +1192160,1,404550073011701,-73.0213972,40.7639611 +1192161,1,404552073011501,-73.020925,40.76455556 +1192162,1,404552073011601,-73.0210222,40.76442778 +1193218,1,404556073582601,-73.97388889,40.76555556 +1192163,1,404630073580801,-73.969,40.77494444 +1193219,1,404635073582201,-73.97277778,40.77638889 +1193220,1,404644073581801,-73.9716111,40.7788 +1193221,1,404646073580401,-73.96777778,40.77944444 +1193222,1,404648073580601,-73.9681944,40.77991667 +1193223,1,404709073574301,-73.9619444,40.7858333 +1193224,1,404741073573801,-73.9606111,40.79469444 +1193225,1,404746073570401,-73.9511111,40.7961111 +1192164,1,405118073551301,-73.9204722,40.85519444 +1192165,1,405119073551402,-73.92063889,40.85552778 +1192166,1,405129073551501,-73.92102778,40.85816667 +1192167,1,405129073551502,-73.9208333,40.8581111 +1192168,1,405129073551503,-73.9210833,40.85819444 +1192169,1,405457072395201,-72.66432778,40.9159472 +1192170,1,405502072382401,-72.6401111,40.9174722 +1192171,1,410134073524801,-73.8799,41.02610556 +1192172,1,410135073530901,-73.885875,41.02634444 +1192173,1,410136073533101,-73.89185278,41.02658056 +1192174,1,410552073522901,-73.8748194,41.09785556 +1192175,1,410554073524701,-73.87977778,41.09831667 +1192176,1,410557073532301,-73.8896944,41.09923889 +1192177,1,410559073534101,-73.89465278,41.0997 +1192178,1,410955073544901,-73.9135722,41.1653361 +1192179,1,411001073544001,-73.9112417,41.1668111 +1192180,1,411016073541501,-73.90425278,41.17124167 +1192181,1,411333073574301,-73.9618083,41.22583056 +1192182,1,411338073573701,-73.96038889,41.22725278 +1192183,1,411404073571201,-73.9532917,41.23436389 +1192184,1,411713073571801,-73.9548667,41.28707778 +1192185,1,411717073571401,-73.9537667,41.28796667 +1192186,1,411723073570601,-73.9515694,41.28974444 +1192187,1,411733073565401,-73.9482722,41.2924111 +1192188,1,412054073573101,-73.9585111,41.34833056 +1192189,1,412056073573701,-73.9604,41.34899444 +1192190,1,412101073575101,-73.96417778,41.3503222 +1192191,1,412445073580501,-73.9679361,41.41251667 +1192192,1,412447073580101,-73.9670444,41.4129861 +1192193,1,412450073575501,-73.9652611,41.41392778 +1192194,1,412455073574501,-73.9625833,41.41533889 +1192195,1,412842073591501,-73.9874056,41.4781833 +1192196,1,412844073593501,-73.9930611,41.4789333 +1192197,1,412848074000601,-74.0015444,41.4800583 +1192198,1,412851074002601,-74.0072,41.4808083 +1192199,1,413251073583901,-73.97742778,41.54754167 +1192200,1,413303073585401,-73.9817861,41.55081667 +1192201,1,413311073590501,-73.9846944,41.553 +1192202,1,413315073591001,-73.9861472,41.55409167 +1192203,1,413702073570401,-73.95115,41.61735278 +1192204,1,413702073571201,-73.9532611,41.61724167 +1192205,1,413702073571901,-73.9553722,41.61713056 +1192206,1,414120073564801,-73.94670278,41.68892778 +1192207,1,414126073562701,-73.9409194,41.69050556 +1192208,1,414544073564101,-73.94478889,41.7621833 +1192209,1,414545073564001,-73.9443222,41.76256944 +1192210,1,414548073563601,-73.94338889,41.7633472 +1192211,1,415000073570501,-73.95145,41.83345556 +1192212,1,415001073565501,-73.9485111,41.8336472 +1192213,1,415001073570001,-73.9499806,41.83355 +1192214,1,415002073564401,-73.945575,41.83383889 +1192215,1,415359073575501,-73.9652722,41.8995861 +1192216,1,415405073574001,-73.9610667,41.9014 +1192217,1,415407073573501,-73.95966389,41.90200278 +1192218,1,415552074302001,-74.5056,41.9311 +1192219,1,415552074302201,-74.5061,41.9311 +1192220,1,415612074315701,-74.5325,41.9367 +1192221,1,415745074270001,-74.45,41.9626 +1192222,1,415754074265901,-74.449700000000007,41.9649 +1192223,1,415801074340901,-74.5692,41.9669 +1192224,1,415811074242501,-74.4069,41.9697 +1192225,1,415812074242501,-74.4069,41.97 +1192226,1,415812074340301,-74.5676,41.9699 +1192227,1,415813073563301,-73.9424444,41.97025278 +1192228,1,415815073563801,-73.9439833,41.97081389 +1192229,1,415816074263001,-74.4417,41.9711 +1192230,1,415817073564401,-73.945525,41.971375 +1192231,1,415820074261501,-74.4375,41.9722 +1192232,1,415823074244901,-74.4136,41.9731 +1192233,1,415824074252801,-74.4244,41.9733 +1192234,1,415829073571701,-73.9547667,41.97473889 +1192235,1,415834074335901,-74.5664,41.9761 +1192236,1,415837074335801,-74.5661,41.9769 +1192237,1,415841074335601,-74.5656,41.9781 +1192238,1,415843074335101,-74.5642,41.9786 +1192239,1,415844074233701,-74.3937,41.9789 +1192240,1,415845074233901,-74.3942,41.9792 +1192241,1,415849074225001,-74.3806,41.9803 +1192242,1,415849074235101,-74.3974,41.9804 +1192243,1,415852074224601,-74.3794,41.9811 +1192244,1,415852074224602,-74.3795,41.9811 +1192245,1,415854074224701,-74.3797,41.9817 +1192246,1,415902074342701,-74.5742,41.9839 +1192247,1,415904074334702,-74.5631,41.9844 +1192248,1,415906074334401,-74.5622,41.985 +1192249,1,415913074334401,-74.5621,41.9869 +1192250,1,415919074341201,-74.57,41.9886 +1192251,1,415928074334401,-74.5622,41.9911 +1192252,1,415938074302301,-74.5064,41.9939 +1192253,1,415940074301001,-74.5028,41.9944 +1192254,1,415959074302701,-74.5076,41.9998 +1192255,1,420017074303201,-74.5089,42.0047 +1192256,1,420021074303601,-74.51,42.0058 +1192257,1,420025074305101,-74.5142,42.0069 +1192258,1,420025074305301,-74.5146417,42.00690556 +1192259,1,420026074304001,-74.511,42.0071 +1192260,1,420026074305301,-74.5146,42.0072472 +1192261,1,420041074303201,-74.5089,42.0114 +1192262,1,420042074303501,-74.5097,42.0117 +1192263,1,420236073553701,-73.92690278,42.0433722 +1192264,1,420238073561201,-73.9366694,42.0440083 +1192265,1,420239073561801,-73.9382972,42.04411389 +1192266,1,420314074273001,-74.4584,42.054 +1192267,1,420655073545901,-73.9164111,42.11515556 +1192268,1,420656073550301,-73.91753889,42.11568056 +1192269,1,420658073550701,-73.91866389,42.11620556 +1192270,1,420700073551101,-73.9197917,42.11672778 +1192271,1,420745074155501,-74.26527778,42.12916667 +1192272,1,420758074160401,-74.26777778,42.13277778 +1192273,1,421042073520601,-73.8683306,42.1782361 +1192274,1,421045073520901,-73.8691,42.17915278 +1192275,1,421048073521201,-73.8698694,42.18006944 +1192276,1,421052073521401,-73.8706417,42.1809861 +1192277,1,421419073494501,-73.82916389,42.2387222 +1192278,1,421424073494801,-73.8300222,42.239875 +1192279,1,421428073495101,-73.8308833,42.24102778 +1192280,1,421749073464201,-73.7784722,42.297 +1192281,1,421752073470301,-73.7841667,42.2979 +1192282,1,421753073470601,-73.7849806,42.29802778 +1192283,1,422204073475301,-73.79810278,42.36781944 +1192284,1,422208073473501,-73.79295,42.36884167 +1192285,1,422209073472701,-73.79088889,42.36925278 +1192286,1,422626073470401,-73.7843694,42.4405083 +1192287,1,422626073470501,-73.7848111,42.44043889 +1192288,1,422627073465601,-73.7821722,42.44085556 +1192289,1,422725076261801,-76.43838889,42.45694444 +1192290,1,422800076260101,-76.4348861,42.466575 +1192291,1,422800076260401,-76.4344167,42.46663889 +1192292,1,422819076250801,-76.4188861,42.4719583 +1192293,1,422836076242301,-76.40628889,42.47664167 +1192294,1,422858076230301,-76.38425,42.4827222 +1192295,1,422858076230601,-76.38488889,42.48291667 +1192296,1,422943076221701,-76.37138889,42.4954722 +1192297,1,422944076221701,-76.3715,42.49569444 +1192298,1,423003076213501,-76.3596944,42.50077778 +1192299,1,423003076213701,-76.36013889,42.50077778 +1192300,1,423005076213201,-76.3589444,42.50144444 +1192301,1,423006076213301,-76.3590833,42.50166667 +1192302,1,423018076213501,-76.3597222,42.5050833 +1192303,1,423027076214901,-76.3635556,42.5073611 +1192304,1,423039073461101,-73.7698333,42.5109333 +1192305,1,423040073461301,-73.7702222,42.511175 +1192306,1,423042073461601,-73.7710056,42.5116611 +1192307,1,423045073462001,-73.7721806,42.51238889 +1192308,1,423057076210901,-76.35255,42.51587778 +1192309,1,423059076194701,-76.3296667,42.5165 +1192310,1,423225076182201,-76.3061111,42.54016667 +1192311,1,423226076182201,-76.3061111,42.5405833 +1192312,1,423236076173201,-76.2924167,42.54355556 +1192313,1,423306076173301,-76.2924972,42.55166667 +1192314,1,423425076174601,-76.29618889,42.5734972 +1192315,1,423455073451901,-73.7554,42.5819583 +1192316,1,423456073451701,-73.7548111,42.5822972 +1192317,1,423457073451601,-73.7545167,42.58246667 +1192318,1,423910073443301,-73.7425611,42.6528472 +1192319,1,423912073443601,-73.7433083,42.65324167 +1192320,1,423912073443701,-73.7436833,42.65344167 +1192321,1,424302073420101,-73.70026389,42.71709444 +1192322,1,424302073420301,-73.7008667,42.7172722 +1192323,1,424303073420701,-73.702075,42.7176333 +1193226,1,425603078533401,-78.89275,42.9340833 +1193227,1,425605078524101,-78.87813889,42.93463889 +1193228,1,425615078531601,-78.88775,42.9373611 +1193229,1,425616078530201,-78.8838056,42.93763889 +1193230,1,425616078530901,-78.88588889,42.93763889 +1193231,1,425908078535601,-78.8988056,42.98555556 +1193232,1,430000078540901,-78.9023611,42.9999722 +1193233,1,430012078541701,-78.90463889,43.00325 +1193234,1,430020078542201,-78.9060833,43.00566667 +1193235,1,430032078542401,-78.9065556,43.0088611 +1193236,1,430046078505001,-78.8471111,43.01269444 +1193237,1,430050078520101,-78.86688889,43.0138333 +1193238,1,430101078521501,-78.8708056,43.0168333 +1193239,1,430102078495701,-78.8325833,43.0170833 +1193240,1,430128078492601,-78.82375,43.0243611 +1193241,1,430441078574101,-78.96138889,43.07794444 +1193242,1,430451078573601,-78.9599167,43.08069444 +1193243,1,430454078573701,-78.9602222,43.0815833 +1193244,1,430500079013001,-79.0248611,43.08338889 +1193245,1,430504078574501,-78.96238889,43.08455556 +1193246,1,430515078574501,-78.96238889,43.08741667 +1193247,1,430517078574501,-78.9624722,43.08791667 +1193248,1,430522078565901,-78.94963889,43.08952778 +1193249,1,430525078564201,-78.9449444,43.09013889 +1193250,1,430530078574401,-78.96225,43.0917222 +1193251,1,430536078561801,-78.9384444,43.0933333 +1193252,1,430536078575301,-78.96475,43.09319444 +1193253,1,430540079012501,-79.0235833,43.09452778 +1193254,1,430541078575301,-78.9645833,43.0947222 +1193255,1,430542078560901,-78.9357222,43.09502778 +1193256,1,430545078560101,-78.93363889,43.09591667 +1193257,1,430552078575701,-78.9658333,43.09777778 +1193258,1,430554078560101,-78.93363889,43.0955833 +1193259,1,430555078553501,-78.9262778,43.09852778 +1193260,1,430558078552401,-78.9233056,43.0993333 +1193261,1,430560078551801,-78.9217222,43.09994444 +1193262,1,430639079005501,-79.0152222,43.1108611 +1193263,1,430649079004301,-79.0118056,43.11363889 +1193264,1,430703078553201,-78.9256667,43.11752778 +1192324,1,431250077322101,-77.53903889,43.21388889 +1192325,1,431314077315901,-77.5332333,43.22059167 +1192326,1,431533076582101,-76.9724806,43.2593 +1192327,1,431601076584701,-76.9795722,43.26681667 +1193265,1,0208725090,-78.7835833,35.83745278 +1193266,1,02103770,-78.8882222,35.07980556 +1192328,1,05059460,-96.9045194,46.83378056 +1192329,1,05059465,-96.9075583,46.84395556 +1192330,1,06355100,-103.0780556,46.0075 +1192331,1,06355350,-102.9058333,45.9886111 +1192332,1,462415101502201,-101.8394083,46.4040361 +1192333,1,462442101414601,-101.6961028,46.4116833 +1192334,1,462523101353001,-101.5915556,46.4230361 +1192335,1,462547101405901,-101.6830833,46.4297444 +1192336,1,462633101414301,-101.6953833,46.4425083 +1192337,1,462633101414601,-101.6962778,46.44243056 +1192338,1,462809101353001,-101.5916389,46.4692472 +1192339,1,462819101591201,-101.9869167,46.4719083 +1192340,1,462910101374501,-101.62905,46.48598056 +1192341,1,462942101513901,-101.8607611,46.4950222 +1192342,1,462954101414601,-101.69615,46.49829167 +1192343,1,463003101581901,-101.9719306,46.5009111 +1192344,1,463004101560701,-101.9352417,46.501 +1192345,1,463004101583401,-101.9763611,46.5010583 +1192346,1,463005101515101,-101.8641194,46.50133889 +1192347,1,463152101382701,-101.6407444,46.5309861 +1192348,1,464503096552700,-96.9243639,46.7510861 +1192350,1,394802084032200,-84.0561111,39.8005611 +1192351,1,394825084034900,-84.0636111,39.80693889 +1192352,1,394853084023300,-84.0425,39.81471944 +1192353,1,395003008403300,-84.0583333,39.83416667 +1192354,1,395003084033000,-84.0583333,39.83416667 +1192355,1,395004084025600,-84.04888889,39.83443889 +1192356,1,395823082535500,-82.8986111,39.97305556 +1192357,1,395831082532700,-82.8908333,39.97527778 +1192358,1,395836082515500,-82.8652778,39.97666667 +1192359,1,395906082542100,-82.9058333,39.985 +1192360,1,395913082532900,-82.89138889,39.98694444 +1192361,1,395949082520500,-82.8680556,39.99694444 +1192362,1,402304084230100,-84.3836111,40.38444444 +1192363,1,411815084393701,-84.6602778,41.30416667 +1192364,1,411815084393702,-84.6602778,41.30416667 +1192365,1,411815087393701,-84.6602778,41.30416667 +1193267,1,412539082565000,-82.9472222,41.4275 +1193268,1,412556082553300,-82.9258333,41.4322222 +1193269,1,412611083002600,-83.0072222,41.43638889 +1193270,1,412613082541800,-82.905,41.43694444 +1193271,1,412635082571000,-82.9527778,41.44305556 +1193272,1,412638082530600,-82.885,41.44388889 +1193273,1,412647082514700,-82.8630556,41.44638889 +1193274,1,412652082555600,-82.9322222,41.44777778 +1193275,1,412652083014100,-83.0280556,41.44777778 +1193276,1,412703082460400,-82.7677778,41.4508333 +1193277,1,412706083000300,-83.0008333,41.45166667 +1193278,1,412709082543900,-82.9108333,41.4525 +1193279,1,412710082450600,-82.7516667,41.45277778 +1193280,1,412711082503600,-82.8433333,41.45305556 +1193281,1,412722083013600,-83.0266667,41.4561111 +1193282,1,412723082585000,-82.9805556,41.45638889 +1193283,1,412724082532100,-82.8891667,41.45666667 +1193284,1,412732082495200,-82.8311111,41.45888889 +1193285,1,412734082573600,-82.96,41.45944444 +1193286,1,412738082443800,-82.74388889,41.46055556 +1193287,1,412741083003200,-83.00888889,41.46138889 +1193288,1,412742082520800,-82.86888889,41.46166667 +1193289,1,412749082464200,-82.7783333,41.4636111 +1193290,1,412751082561500,-82.9375,41.46416667 +1193291,1,412752082423800,-82.7105556,41.46444444 +1193292,1,412754082411200,-82.6866667,41.465 +1193293,1,412757082590000,-82.9833333,41.4658333 +1193294,1,412758082473500,-82.7930556,41.4661111 +1193295,1,412758082505300,-82.8480556,41.4661111 +1193296,1,412804082452300,-82.75638889,41.46777778 +1193297,1,412808082550200,-82.9172222,41.46888889 +1193298,1,412820082440500,-82.7347222,41.4722222 +1193299,1,412824082534400,-82.8955556,41.4733333 +1193300,1,412828082574100,-82.96138889,41.47444444 +1193301,1,412833082425300,-82.7147222,41.4758333 +1193302,1,412833082481900,-82.8052778,41.4758333 +1193303,1,412834082492400,-82.8233333,41.4761111 +1193304,1,412836082414400,-82.6955556,41.47666667 +1193305,1,412841082522900,-82.8747222,41.47805556 +1193306,1,412846082470200,-82.78388889,41.47944444 +1193307,1,412848082564000,-82.9444444,41.48 +1193308,1,412856082494500,-82.8291667,41.4822222 +1193309,1,412856082511500,-82.8541667,41.4822222 +1193310,1,412857082552400,-82.9233333,41.4825 +1193311,1,412902082454700,-82.7630556,41.48388889 +1193312,1,412902082541200,-82.9033333,41.48388889 +1193313,1,412914082524600,-82.8794444,41.4872222 +1193314,1,412917082443100,-82.7419444,41.48805556 +1193315,1,412925082484100,-82.81138889,41.49027778 +1193316,1,412935082431700,-82.72138889,41.49305556 +1193317,1,412935082512900,-82.8580556,41.49305556 +1193318,1,412942082472300,-82.7897222,41.495 +1193319,1,412951082415700,-82.6991667,41.4975 +1193320,1,412951082503000,-82.8416667,41.4975 +1193321,1,412955082460800,-82.76888889,41.4986111 +1193322,1,413014082445100,-82.7475,41.50388889 +1193323,1,413029082433800,-82.7272222,41.50805556 +1193324,1,413049082422600,-82.7072222,41.5136111 +1193325,1,07164480,-96.0573694,36.1419111 +1192366,1,07241504,-97.418475,35.41501667 +1192367,1,07241506,-97.4172222,35.435025 +1193326,1,07332335,-96.6737917,34.47778056 +1193327,1,07332340,-96.6815444,34.47575278 +1192368,1,11492550,-121.8484722,42.8704083 +1192369,1,11493100,-121.8727556,42.88709167 +1192370,1,11508700,-121.848686,42.1467833 +1192371,1,11509380,-121.9481222,42.13488056 +1192372,1,13292800,-116.7937222,45.8529444 +1193328,1,13318960,-118.1908,45.35398889 +1193329,1,14012391,-118.383861,45.9448611 +1193330,1,14012392,-118.3838889,45.9452222 +1193331,1,14012393,-118.38375,45.94525 +1192373,1,14046100,-119.627361,44.7775 +1192374,1,14080580,-120.87525,44.2215833 +1192375,1,14103030,-120.9132139,45.6326611 +1192376,1,14121100,-121.5084028,45.71447778 +1193332,1,14144790,-122.4478389,43.53996944 +1192378,1,14159040,-122.046,44.13602778 +1192380,1,14178430,-121.9268889,44.7646944 +1192383,1,14187201,-122.6886956,44.4123468 +1192384,1,14188570,-122.8895833,44.5383333 +1193333,1,14206339,-122.8752222,45.55696389 +1193334,1,142063391,-122.874236,45.55603056 +1193335,1,142063398,-122.8737194,45.55631389 +1192385,1,14206752,-122.8370556,45.38541667 +1193336,1,14206956,-122.7626694,45.38728889 +1192386,1,14252950,-123.8678333,46.1765833 +1193337,1,14300350,-123.49211940000001,45.9351611 +1193338,1,420024121132800,-121.224461,42.00668889 +1192387,1,420037121334100,-121.5614222,42.01040278 +1192388,1,420833121402000,-121.672186,42.14258889 +1192389,1,421206119531400,-119.887361,42.20175 +1192390,1,421538119523700,-119.8768333,42.26044444 +1192391,1,422641119502900,-119.8413889,42.44466667 +1192392,1,423612120111400,-120.1873333,42.60344444 +1193339,1,423655121205000,-121.3473139,42.61514444 +1193340,1,423820121522500,-121.8736833,42.63901944 +1193341,1,423841121211400,-121.353975,42.644825 +1193342,1,423949121504700,-121.8463583,42.66367778 +1193343,1,424041121500500,-121.8348444,42.6780972 +1193344,1,424042121500700,-121.8351472,42.67819444 +1193345,1,424140121161300,-121.2703167,42.6943722 +1193346,1,424143121162500,-121.273486,42.69520278 +1193347,1,424324121494200,-121.8282556,42.72341944 +1193348,1,424623121453700,-121.7601806,42.77308056 +1193349,1,424859121385800,-121.6493472,42.8162722 +1193350,1,424926121395100,-121.6641917,42.8239861 +1193351,1,425047123225600,-123.3822639,42.8465222 +1193352,1,425055123225600,-123.3822028,42.8485972 +1193353,1,425105121091200,-121.1532583,42.85130556 +1193354,1,425118123234900,-123.3968806,42.8551 +1193355,1,425125123230600,-123.38497220000001,42.85691944 +1193356,1,425306121353400,-121.5927306,42.88496389 +1193357,1,425326121322100,-121.5392333,42.89061944 +1193358,1,425338121313800,-121.5273389,42.8939333 +1193359,1,425537121083800,-121.1439222,42.9269611 +1193360,1,425626121275000,-121.4639917,42.94051667 +1193361,1,425657121130700,-121.2186083,42.94916944 +1193362,1,425702121264800,-121.446761,42.95067778 +1193363,1,425705121270100,-121.450261,42.95139444 +1193364,1,425818118520500,-118.8679444,42.97177778 +1193365,1,425839121145500,-121.2486,42.97740278 +1193366,1,425906121152700,-121.2574056,42.98504167 +1193367,1,430005121224300,-121.3785778,43.0014111 +1193368,1,430007121180000,-121.2999444,43.00183056 +1193369,1,430242118502100,-118.8392778,43.04505556 +1193370,1,430351121291000,-121.4862389,43.06416667 +1193371,1,430543121325800,-121.54955,43.0953361 +1193372,1,430649121304300,-121.5118889,43.11366944 +1193373,1,431254121341300,-121.5702139,43.2151222 +1193374,1,431528121365100,-121.6141889,43.2578472 +1193375,1,431605118510600,-118.8515278,43.2679722 +1193376,1,431702121391800,-121.6551222,43.2838611 +1193377,1,431731121373400,-121.626136,43.29204444 +1193378,1,432148121353100,-121.5920556,43.36321389 +1192393,1,434034121492600,-121.8239472,43.676225 +1192394,1,434441121465600,-121.7823056,43.74460278 +1192395,1,434935121475000,-121.7971472,43.8265222 +1192396,1,435224121463400,-121.7762,43.873425 +1192397,1,440119121405000,-121.6806167,44.02189167 +1192398,1,440139121333500,-121.5596583,44.0273972 +1192399,1,440145121351100,-121.586486,44.02906944 +1192400,1,440210121353400,-121.5928722,44.03611944 +1192401,1,440210121455800,-121.7662194,44.03609444 +1192402,1,440214121454800,-121.7634389,44.03718889 +1192403,1,440243121364500,-121.6124083,44.04531944 +1192404,1,440246121355700,-121.5991917,44.04604167 +1192405,1,440248121355900,-121.5996472,44.0467 +1192406,1,440305121365000,-121.6137778,44.05141389 +1192407,1,440306121364900,-121.6136222,44.05161389 +1192408,1,440759122285900,-122.4830833,44.1331111 +1192409,1,440818122222000,-122.3723333,44.13825 +1192410,1,440859122215300,-122.3646667,44.1495833 +1192411,1,440935122200400,-122.3343056,44.1597222 +1192412,1,441022122193201,-122.3242222,44.17319444 +1192413,1,441022122193202,-122.3242222,44.17319444 +1192414,1,441022122193203,-122.3242222,44.17319444 +1192415,1,441022122193204,-122.3242222,44.17319444 +1192416,1,441119121392000,-121.655661,44.1886611 +1192417,1,441121121395000,-121.6639139,44.18929444 +1192418,1,441202121413500,-121.6930083,44.20065 +1192419,1,441425121420300,-121.7007722,44.24019444 +1192420,1,441712120503800,-120.8439806,44.28653889 +1192421,1,441922120530100,-120.8835972,44.32270278 +1192422,1,441949120533501,-120.893175,44.3302833 +1192423,1,441953121024001,-121.0444194,44.33146944 +1192424,1,442013120553700,-120.9269889,44.3369861 +1192425,1,442206121081900,-121.1386194,44.36829167 +1192426,1,442708121433200,-121.7254167,44.4521472 +1192427,1,442709120443200,-120.7421222,44.4525083 +1192428,1,442747121382400,-121.640086,44.4631583 +1192429,1,442931121405800,-121.6828417,44.49196389 +1192430,1,443015121395600,-121.6654806,44.5041583 +1193379,1,443016122095400,-122.1651,44.5045 +1192431,1,443034121432400,-121.7232583,44.5093611 +1192432,1,443115121375500,-121.6320222,44.52071667 +1192433,1,443238121400000,-121.6665667,44.54378889 +1192434,1,443258121425200,-121.71445,44.5493972 +1192435,1,443412121371500,-121.62095,44.56991667 +1192436,1,443432121370800,-121.6190167,44.5756833 +1192437,1,443432121370900,-121.6192194,44.5755694 +1192438,1,444306122144601,-122.2461389,44.7183194 +1192439,1,444306122144602,-122.2461389,44.7183194 +1192440,1,444306122144603,-122.2461389,44.7183194 +1192441,1,444306122144604,-122.2461389,44.7183194 +1193380,1,450822122320300,-122.5340694,45.13935278 +1193381,1,451422122422700,-122.7074889,45.23951389 +1192442,1,451422122423000,-122.7083333,45.2393222 +1192443,1,451429122423200,-122.7089389,45.2413583 +1192444,1,451441122412900,-122.691261,45.2446 +1192445,1,451501122421600,-122.7044583,45.2501972 +1192446,1,451555122423700,-122.710336,45.2651833 +1192447,1,453027122400000,-122.6666139,45.50748056 +1192448,1,455034118033100,-118.0585,45.8426611 +1192449,1,455643117580000,-117.9667806,45.9452 +1192450,1,021107205,-79.0275,33.6833333 +1192451,1,02131710,-79.94338889,34.0592222 +1193382,1,02136371,-79.2880278,33.3598611 +1192452,1,02160900,-81.32296259,34.3013481 +1192453,1,021622825,-82.7495056,35.04753889 +1193383,1,02171920,-79.4191667,33.07444444 +1192454,1,02171930,-79.6251111,33.0302222 +1192455,1,0217208135,-80.1826944,33.0041111 +1193384,1,021721675,-80.1068611,32.7851111 +1193385,1,02175090,-80.7021944,32.93219444 +1193386,1,02175310,-81.3562222,33.209 +1192456,1,02176510,-81.0539953,32.79683624 +1192457,1,021765184,-80.9123056,32.54338889 +1192458,1,021765795,-80.813975,32.2878722 +1192459,1,02176702,-80.7884167,32.2285 +1193387,1,325555080420800,-80.7019444,32.93194444 +1192460,1,335652080251500,-80.4209722,33.94788889 +1192461,1,335713080282300,-80.47313889,33.95375 +1192462,1,335729080265400,-80.4484167,33.95816667 +1192463,1,335731080284300,-80.4786111,33.95852778 +1192464,1,335738080272400,-80.45663889,33.96052778 +1192465,1,335745080253600,-80.4265556,33.96241667 +1192466,1,335817080300900,-80.50263889,33.97141667 +1192467,1,335849080294800,-80.4966667,33.98038889 +1192468,1,335855080265700,-80.44925,33.98194444 +1192469,1,335920080275000,-80.46375,33.98894444 +1192470,1,335922080275100,-80.4641944,33.98952778 +1192471,1,335924080285900,-80.4830556,33.99 +1192472,1,335926080280900,-80.46925,33.9904722 +1193388,1,340330079555000,-79.9305556,34.0584722 +1193389,1,342346079261500,-79.4376667,34.3961111 +1192473,1,430910098313500,-98.5263611,43.1529111 +1193390,1,440449103162801,-103.274683,44.080505 +1193391,1,440449103162901,-103.274728,44.080483889999996 +1193392,1,440450103162901,-103.2747719,44.08058278 +1192474,1,03538252,-84.3594778,35.96304444 +1193393,1,03544600,-85.0160111,35.49051667 +1193394,1,03544611,-85.000925,35.507475 +1192475,1,352620087283200,-87.4755728,35.43896544 +1192476,1,07227700,-101.7101472,35.58688889 +1192477,1,07312620,-98.4638056,33.97043889 +1192478,1,07312630,-98.4620944,33.98427778 +1192479,1,07312640,-98.5250083,33.93784167 +1192480,1,07312645,-98.4376278,33.98368889 +1193395,1,07346051,-94.6727111,32.63508889 +1193396,1,08021599,-94.5501111,32.50778056 +1192481,1,08037060,-94.6583889,31.631875 +1193397,1,08042521,-94.05805,29.8211111 +1193398,1,08048508,-97.3278056,32.78316667 +1192482,1,08051197,-97.0311389,33.30916667 +1192483,1,08051220,-97.0300278,33.29558333 +1192484,1,08051230,-97.0552222,33.28702778 +1192485,1,08051600,-97.0924722,33.28183333 +1192486,1,08052900,-96.9933333,33.0538611 +1192487,1,08055605,-96.8828889,32.86169444 +1193399,1,08065900,-95.52885,30.92581944 +1193400,1,08066143,-95.3334778,30.96842778 +1192488,1,08067654,-95.4914639,30.32529444 +1192489,1,08067656,-95.4691861,30.31373056 +1192490,1,08068002,-95.4379972,30.30150833 +1192491,1,08083405,-99.8082528,32.42970833 +1192492,1,08083410,-99.8040111,32.45315833 +1192493,1,08083412,-99.8117806,32.45365278 +1192494,1,08100700,-97.6249861,31.24461389 +1192495,1,08104590,-97.9658,30.8139 +1192496,1,08105892,-97.5667,30.5263 +1192497,1,08109335,-97.8016472,31.0330222 +1192498,1,08131550,-100.47775,31.37613889 +1192499,1,08131590,-100.3972944,31.41421667 +1192500,1,08132200,-100.4392194,31.41497778 +1192501,1,08136005,-100.402,31.45476667 +1192502,1,08136010,-100.4032333,31.43995556 +1192503,1,08136020,-100.3788028,31.45061944 +1192504,1,08136030,-100.3745417,31.44123333 +1193401,1,08163480,-97.1396889,29.56773889 +1193402,1,08181482,-98.6265694,29.36695 +1192505,1,08185020,-98.2796667,29.55091667 +1192506,1,08185025,-98.2628861,29.54166667 +1192507,1,08185030,-98.2605111,29.54143333 +1192508,1,08185040,-98.2538389,29.55093333 +1192509,1,08185087,-98.2957861,29.52572778 +1192510,1,08185097,-98.2668472,29.51494444 +1192511,1,294237095225801,-95.3827889,29.71043056 +1192512,1,294238095225701,-95.3827361,29.71059444 +1192513,1,294621095221601,-95.3711694,29.772675 +1192514,1,294622095221601,-95.3711694,29.77288889 +1193403,1,334132096002201,-96.0063,33.69241944 +1193404,1,10141450,-111.9966694,41.0408861 +1192515,1,370830109513901,-109.86095,37.1418 +1192516,1,370835109061201,-109.1032194,37.143 +1192517,1,370912109080501,-109.1348167,37.1534333 +1192518,1,371216109504001,-109.8444889,37.20453056 +1192519,1,371220109124401,-109.2122972,37.2055333 +1192520,1,371247109110601,-109.1850167,37.2131861 +1192521,1,371602109212501,-109.3570722,37.2671583 +1192522,1,384914109165001,-109.2805194,38.8207111 +1193405,1,390450110083501,-110.1430939,39.08041694 +1192523,1,410326112020901,-112.0358333,41.0573583 +1192524,1,412826112131801,-112.2216778,41.4737861 +1192525,1,412859112091401,-112.1538083,41.4830611 +1192526,1,413239112055401,-112.0982,41.54406944 +1193406,1,415955111212401,-111.3567167,41.9985722 +1193407,1,434928072192701,-72.3242194,43.8243222 +1193408,1,0162932568,-78.56665,38.58708889 +1193409,1,0163382274,-78.3754111,38.9544611 +1193410,1,0163382343,-78.3720611,38.9517 +1193411,1,360634077541201,-77.9033,38.10949444 +1192527,1,380546077493101,-77.8252778,38.0961111 +1192528,1,380602077500001,-77.8333333,38.10055556 +1193412,1,380603077495801,-77.8327778,38.1008333 +1192529,1,380603077505201,-77.8477778,38.1008333 +1193413,1,380606077495501,-77.832075,38.10173056 +1193414,1,380606077495601,-77.8321333,38.10176944 +1193415,1,380606077495602,-77.8321333,38.10169167 +1193416,1,380606077495603,-77.8321722,38.10166667 +1193417,1,380606077495604,-77.8322083,38.1016361 +1193418,1,380606077495605,-77.8322444,38.10161944 +1192530,1,380608077511901,-77.8552778,38.1022222 +1192531,1,380612077502601,-77.8405556,38.1033333 +1192532,1,380616077513901,-77.8608333,38.10444444 +1192533,1,380623077521001,-77.8694444,38.10638889 +1192534,1,380627077523401,-77.8761111,38.1075 +1192535,1,380635077530201,-77.88388889,38.1097222 +1192536,1,380635077541601,-77.9044444,38.1097222 +1192537,1,380636077535001,-77.8972222,38.11 +1192538,1,380640077502601,-77.8405556,38.1111111 +1193419,1,380641077534701,-77.9027694,38.11033889 +1193420,1,380642077534701,-77.9027194,38.11041944 +1193421,1,380642077534702,-77.90273889,38.11038056 +1193422,1,380642077534703,-77.90278889,38.1103 +1193423,1,380642077534704,-77.9028111,38.11025 +1193424,1,380642077534801,-77.9027,38.1104611 +1192539,1,380643077532401,-77.89,38.11194444 +1192540,1,380643077544001,-77.9111111,38.11194444 +1192541,1,380650077561101,-77.93638889,38.11388889 +1192542,1,380653077554401,-77.92888889,38.1147222 +1192543,1,380656077551801,-77.9216667,38.11555556 +1192544,1,380700077504401,-77.8455556,38.11666667 +1192545,1,380701077545101,-77.9141667,38.11694444 +1192546,1,380704077562801,-77.9411111,38.11777778 +1192547,1,380709077565201,-77.9477778,38.11916667 +1192548,1,380720077505001,-77.8472222,38.1222222 +1192549,1,380736077510901,-77.8525,38.12666667 +1192550,1,380742077513601,-77.86,38.1283333 +1192551,1,380753077523801,-77.8772222,38.13305556 +1193425,1,380756077523801,-77.87733889,38.13234167 +1193426,1,380756077523901,-77.8774861,38.13216944 +1193427,1,380756077523902,-77.8774861,38.13220278 +1193428,1,380756077523903,-77.87745,38.132238890000004 +1193429,1,380756077523904,-77.87741389,38.1322722 +1193430,1,380756077523905,-77.877375,38.1323083 +1192552,1,380759077515301,-77.8647222,38.13305556 +1192553,1,380802077521301,-77.8702778,38.13388889 +1192554,1,380802077530401,-77.8844444,38.13388889 +1193431,1,380809077531901,-77.8886111,38.1358333 +1192555,1,380815077532201,-77.8894444,38.1375 +1192556,1,380819077534101,-77.8947222,38.1386111 +1193432,1,12039215,-124.1774889,47.24798889 +1193433,1,1203950340,-123.914311,47.4282194 +1193434,1,1203950360,-123.9452389,47.44243889 +1193435,1,1203950780,-124.0226,47.4625111 +1193436,1,12039870,-124.191411,47.5351 +1193437,1,12039890,-124.270011,47.5419194 +1193438,1,12072790,-122.6124389,47.4071583 +1192557,1,12089220,-122.5204778,46.9150083 +1192558,1,12089240,-122.5642917,46.93353889 +1192559,1,12089245,-122.5690722,46.93982778 +1192560,1,12089260,-122.5903889,46.95648889 +1192561,1,12089265,-122.6061139,46.95817778 +1192562,1,12089270,-122.6119278,46.9599833 +1193439,1,12097855,-121.861386,47.13555 +1193440,1,12097865,-121.8748417,47.1505472 +1193441,1,12097875,-121.8983944,47.1425944 +1193442,1,12097880,-121.8990056,47.15551667 +1193443,1,12098525,-121.9550972,47.15708056 +1193444,1,12098590,-121.9738583,47.16090556 +1193445,1,12112544,-122.1581417,47.3238944 +1193446,1,12113445,-122.3111389,47.52713889 +1193447,1,12119995,-122.1623472,47.60300556 +1193448,1,12126050,-122.1931472,47.78728889 +1193449,1,12127475,-122.3142556,47.7729583 +1193450,1,12128495,-122.2720806,47.95154167 +1193451,1,12132900,-121.5350694,47.80335 +1192563,1,12150200,-122.012636,47.7441083 +1192564,1,12150300,-122.0141667,47.7140444 +1192565,1,12177510,-121.1499389,48.7171333 +1193452,1,12181900,-121.3546806,48.51789167 +1193453,1,12181950,-121.364486,48.51610278 +1192566,1,12184800,-121.5945523,48.48480227 +1192567,1,12187980,-121.1947639,48.24776667 +1192568,1,12187995,-121.2934333,48.2497861 +1192569,1,12188100,-121.334325,48.2666444 +1192570,1,12188390,-121.4372056,48.3280444 +1192571,1,12188395,-121.4397389,48.34373056 +1192572,1,12194580,-121.840011,48.52164167 +1192573,1,12194700,-121.850561,48.51699167 +1192574,1,12466015,-119.2021944,47.42803889 +1192575,1,1247351910,-119.2643559,46.3833387 +1193454,1,1247351985,-119.2660444,46.3512333 +1192576,1,12480690,-120.6641778,47.3273611 +1192577,1,12480695,-120.6747472,47.32151389 +1192578,1,12480840,-120.7019292,47.29346915 +1193455,1,12512020,-119.231536,46.24586667 +1192579,1,1251420010,-119.1360556,46.22385278 +1193456,1,12514450,-119.1206056,46.22110278 +1193457,1,12514800,-119.0461556,46.18815556 +1192580,1,13344550,-118.184486,46.56449167 +1192581,1,14014900,-118.4270694,46.02378889 +1192582,1,14017580,-118.6686,46.0565222 +1192583,1,14110600,-121.1830667,46.04277778 +1192584,1,14113100,-121.259611,45.7162472 +1192585,1,14113150,-121.2814667,45.7037861 +1192586,1,14123600,-121.5218778,45.729375 +1192587,1,14125600,-121.645586,45.71864167 +1192588,1,14144200,-122.3794444,45.58731389 +1193458,1,14243550,-122.9095883,46.26720869 +1193459,1,14244100,-122.9063862,46.1767895 +1193460,1,14244180,-122.9160553,46.14722008 +1192589,1,454444122453100,-122.7587222,45.74552778 +1192590,1,455502122481700,-122.8046944,45.9171944 +1192591,1,460033122510500,-122.8512778,46.0092222 +1192592,1,460356118063900,-118.1108028,46.06553056 +1192593,1,460621122573800,-122.9606667,46.10580556 +1192594,1,461638119161500,-119.27075,46.2770833 +1192595,1,461825119154800,-119.2633056,46.3069444 +1193461,1,462025118994781,-118.9947806,46.2025111 +1193462,1,462192119145446,-119.1454472,46.21929167 +1193463,1,462235119112763,-119.1127639,46.22355278 +1192596,1,464000120273100,-120.4586306,46.66675 +1193464,1,464019120264300,-120.4453778,46.67213889 +1192597,1,464028120264229,-120.4450806,46.67453889 +1192598,1,464031120283022,-120.475061,46.6755111 +1193465,1,464044120264000,-120.4445583,46.6789972 +1193466,1,464056120265900,-120.4498194,46.68235 +1192599,1,464123120270700,-120.452011,46.68975 +1192600,1,464124120285900,-120.483311,46.6902 +1193467,1,471515122262600,-122.4406417,47.25406667 +1193468,1,472240122125960,-122.2165556,47.3779222 +1193469,1,473321122390599,-122.6516639,47.5560611 +1192601,1,473321122390620,-122.6517222,47.55600556 +1192602,1,473321122390653,-122.6518139,47.55606389 +1192603,1,473321122390672,-122.6518667,47.5559694 +1192604,1,473321122390721,-122.6520028,47.5560611 +1192605,1,473321122390740,-122.6520556,47.5560972 +1192606,1,473322122390501,-122.6516306,47.5561 +1193470,1,473322122390556,-122.6515444,47.556225 +1193471,1,473322122390561,-122.6516639,47.5561611 +1193472,1,473322122390578,-122.6516056,47.55620556 +1193473,1,473322122390593,-122.6516472,47.55615556 +1192607,1,473322122390602,-122.6517222,47.5561333 +1193474,1,473322122390634,-122.651761,47.55622778 +1193475,1,473322122390652,-122.651811,47.55634167 +1193476,1,473323122390659,-122.6518306,47.5564194 +1192608,1,485759119423600,-119.71,48.96638889 +1192609,1,371938081312401,-81.5234167,37.32727778 +1192610,1,372142081320401,-81.5345556,37.3616111 +1192611,1,372147081314301,-81.5285278,37.36305556 +1192612,1,372158081322501,-81.54025,37.36616667 +1192613,1,372201081303501,-81.5096667,37.367 +1192614,1,372326081340301,-81.56738889,37.39063889 +1192615,1,040244545,-92.0272222,46.69916667 +1193477,1,04026449,-90.7071389,46.26973056 +1193478,1,04026586,-90.9239722,46.35152778 +1192616,1,0402659632,-90.8906111,46.44730556 +1192617,1,0402659635,-90.8905556,46.4444444 +1192618,1,0402659638,-90.8896389,46.44291667 +1193479,1,04027529,-90.8244722,46.47188889 +1192619,1,0407991001,-89.0539333,44.41730556 +1192620,1,0408720154,-87.8918611,42.9183611 +1193480,1,040872343,-87.972,42.8391111 +1193481,1,04087262,-87.8254444,42.6535 +1192621,1,05341493,-92.6443139,45.1227694 +1193482,1,05390350,-89.1416111,45.8943611 +1193483,1,05390990,-89.5510444,45.83191667 +1192622,1,05404142,-90.0730556,43.6197222 +1192623,1,05404143,-90.1005556,43.6286111 +1192624,1,05404145,-90.0833333,43.6058333 +1192625,1,423705088363501,-88.60983889,42.6181222 +1193484,1,424827088241601,-88.4044444,42.8075 +1192626,1,425620087534001,-87.8943167,42.9389861 +1192627,1,425622087544601,-87.9127611,42.93941667 +1192628,1,425624087535801,-87.8995028,42.9399222 +1193485,1,430532089315402,-89.4215222,43.07707778 +1192629,1,435035088574801,-88.9632333,43.8430611 +1193486,1,454715092182601,-92.30725,45.7875833 +1193487,1,463101091353901,-91.5941667,46.5169444 +1193488,1,463101091361201,-91.6033333,46.5169444 +1193489,1,463301091352001,-91.5888889,46.55027778 +1193490,1,463443091370001,-91.6166667,46.5786111 +1193491,1,463823091341601,-91.5711111,46.6397222 +1193492,1,464032091345601,-91.5822222,46.67555556 +1192630,1,464048091563501,-91.9430556,46.68 +1193493,1,464109091554701,-91.9297222,46.6858333 +1192631,1,464133091513401,-91.8594444,46.6925 +1192632,1,464141091474801,-91.7966667,46.6947222 +1193494,1,464146091505901,-91.8497222,46.6961111 +1192633,1,464155091562601,-91.9405556,46.6986111 +1193495,1,464200091470001,-91.7833333,46.7 +1192634,1,464214091563001,-91.9416667,46.70388889 +1192635,1,464230091562601,-91.9405556,46.7083333 +1193496,1,464246091355901,-91.5997222,46.71277778 +1192636,1,464257091434101,-91.7280556,46.7158333 +1193497,1,464307091360701,-91.6019444,46.7186111 +1193498,1,464307091432601,-91.7238889,46.7186111 +1192637,1,464318092034701,-92.0631111,46.72175 +1192638,1,464345091401501,-91.6708333,46.72916667 +1193499,1,464352091402101,-91.6725,46.7311111 +1193500,1,464451091363601,-91.61,46.7475 +1193501,1,464455091370501,-91.6180556,46.7486111 +1192639,1,464518091364301,-91.6119444,46.755 +1193502,1,464533091341701,-91.5713889,46.75916667 +1192640,1,464545091371301,-91.6202778,46.7625 +1193503,1,464616091290201,-91.4838889,46.7711111 +1193504,1,464650091083001,-91.1416667,46.78055556 +1192641,1,464738091231201,-91.3866667,46.79388889 +1193505,1,464747091071401,-91.1205556,46.79638889 +1193506,1,464748091221401,-91.3705556,46.79666667 +1192642,1,464754091075101,-91.1308306,46.79838056 +1193507,1,464755091035901,-91.0663889,46.7986111 +1192643,1,464756091232501,-91.3902778,46.79888889 +1193508,1,464759091040601,-91.0683333,46.7997222 +1193509,1,464813091055001,-91.0972222,46.8036111 +1193510,1,464837091040401,-91.0677778,46.81027778 +1193511,1,464903091042001,-91.0722222,46.8175 +1193512,1,464958091173901,-91.2941667,46.83277778 +1192644,1,465001091160901,-91.2691667,46.8336111 +1193513,1,465016091155301,-91.2647222,46.83777778 +1192645,1,465042091102201,-91.1727778,46.845 +1193514,1,465102091112501,-91.1902778,46.85055556 +1192646,1,465124091101801,-91.1716667,46.85666667 +1192647,1,465133091060301,-91.1007,46.85915 +1193515,1,465133091065501,-91.1152778,46.85916667 +1192648,1,465201091071601,-91.1211111,46.8669444 +1193516,1,465203091134101,-91.2280556,46.8675 +1193517,1,465250091034101,-91.0613889,46.88055556 +1192649,1,465303091030401,-91.0511111,46.88416667 +1193518,1,8801234501201,-88.7273917,42.83008889 +1193519,1,88240606302,-88.8764722,42.90006389 +1193520,1,88240606310,-88.7273972,42.83006944 +1193521,1,88240606325,-88.7294667,42.8338611 +1193522,1,88240606328,-88.7294667,42.8338611 +1192650,1,09194895,-109.8357167,43.03495278 +1192651,1,09194900,-109.8700222,42.99975 +1192652,1,09195000,-109.9094139,42.9931111 +1192653,1,09255200,-107.4402583,41.01674167 +1192654,1,09259049,-107.6837806,41.02921389 +1192655,1,8820231016,-106.809,43.0245472 +1193523,1,16890850,134.5302778,7.44872222 +1193524,1,16891425,134.6064444,7.51058333 +1193525,1,16891770,134.4498472,7.33228889 +1193526,1,50111315,-66.5039361,18.0831 +1193527,1,480233089354001,-89.5944444,48.04238889 +1193528,1,480327089351901,-89.5885833,48.0575833 +1193529,1,480806089323901,-89.54425,48.13491667 +1193530,1,492728088313501,-88.5265,49.4578333 +1193531,1,493202089010401,-89.0178889,49.5339444 +1193532,1,494551094332301,-94.5565,49.76430556 +1193533,1,494559094303801,-94.5106111,49.76663889 +1193534,1,494610094295701,-94.4990556,49.76963889 +1193535,1,494638094312701,-94.5241111,49.7770833 +1193536,1,494856089043701,-89.077,49.81555556 +1193537,1,495738088011001,-88.0194722,49.9606944 +1193538,1,500109088545501,-88.9155278,50.0191944 +1193539,1,500616088095901,-88.1662778,50.1044444 +1192656,1,490938115113101,-115.1919306,49.1604694 +1192657,1,491045115100801,-115.168661,49.17928056 +1192658,1,493946114541801,-114.9029889,49.66283889 +1192659,1,502329114551701,-114.9212194,50.39148889