#Building the Libraries in the Nation
####This project focuses on using the data from https://daviesproject.princeton.edu/databases/
####Load Libraries

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(ggplot2)
library (magrittr)
library (knitr)
library (stringr)
library (tidyr)
## 
## Attaching package: 'tidyr'
## The following object is masked from 'package:magrittr':
## 
##     extract
library (ggmap)
## 
## Attaching package: 'ggmap'
## The following object is masked from 'package:magrittr':
## 
##     inset
library (USAboundaries)
library(tidyverse)
## Loading tidyverse: tibble
## Loading tidyverse: readr
## Loading tidyverse: purrr
## Conflicts with tidy packages ----------------------------------------------
## filter(): dplyr, stats
## inset():  magrittr, ggmap
## lag():    dplyr, stats
library(leaflet)
library(historydata)

#The data in my work on libraries in the United States came from the _Davies Project_ at Princeton University. Their website identifies the purpose of their project as one that focuses on the history of collections. >Research into the History of Libraries in the United States, especially those at Universities and the History of their Collections The Davies Project is an on-going project at Princeton aimed at increasing knowledge of the history of the collections in university libraries in general and their rare book collections in particular.  
###GMU University Libraries Research Leave Day one geocoding data.

# Load and prepare data ---------------------------------------------------


davies <- read_csv("~/Github/nationallibraries/Data/libraries_davies.csv")
## Parsed with column specification:
## cols(
##   plus = col_integer(),
##   mcmullen = col_integer(),
##   state = col_character(),
##   locality = col_character(),
##   name = col_character(),
##   type = col_character(),
##   founding_date = col_integer(),
##   em = col_integer(),
##   ml = col_integer(),
##   ce = col_integer(),
##   de = col_integer(),
##   sz = col_integer(),
##   ld = col_integer(),
##   vs = col_integer(),
##   location = col_character()
## )
#tidy the data a bit.
  davies <- davies %>%
    filter(!is.na(plus)) %>%
    mutate(locality = str_trim(locality),
           state = str_trim(state),
           type = str_trim(type))
 # Create a unique types of libraries sets.  
  types <- unique(davies$type)
  
  library_types <- data_frame(davies_types = types)
  write_csv(library_types, "library-types.csv")
  
  
  davies %>%
    left_join(library_types, by = c("type" = "davies_types"))
## # A tibble: 8,528 × 15
##     plus mcmullen state    locality
##    <int>    <int> <chr>       <chr>
## 1   7093        2    AK     Eufaula
## 2   5386       29    AK Libbysville
## 3   2560       28    AK       Sitka
## 4   7731       30    AK       Sitka
## 5   6232        1    AL      Auburn
## 6   4412    12001    AL  Birmingham
## 7   6240        3    AL    Florence
## 8   1846        4    AL Gainesville
## 9   6239        5    AL  Greensboro
## 10  5702        7    AL  Greensboro
## # ... with 8,518 more rows, and 11 more variables: name <chr>, type <chr>,
## #   founding_date <int>, em <int>, ml <int>, ce <int>, de <int>, sz <int>,
## #   ld <int>, vs <int>, location <chr>
  places <- davies %>%
    select(locality, state) %>%
    distinct() %>%
    arrange(state, locality)
  
  
  places_combined<-places%>%
    mutate(location=paste (locality, state, sep=', '))
  #write_csv(places, "~/GitHub/nationallibraries/Data/places_combined.csv")
 # write_csv(places_combined, "~/GitHub/nationallibraries/Data/places_combined.csv")
  
#location_geocoded <- geocode(as.character(davies$location))


#split the data so I can use the non-business geocode from Google. Their limit is 2500 per day.
places_combined_a<-places_combined[1:2499,]
places_combined_b<-places_combined[2500:3653,]

#Geocode the locations.

places_combined_a<-geocode(as.character(places_combined_a$location))
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eufaula,%20AK&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Libbysville,%20AK&sensor=false
## Warning: geocode failed with status ZERO_RESULTS, location = "Libbysville,
## AK"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sitka,%20AK&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Auburn,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Birmingham,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Florence,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gainesville,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greensboro,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Huntsville,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=La%20Grange,%20AL&sensor=false
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marion,%20AL&sensor=false
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mobile,%20AL&sensor=false
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Montgomery,%20AL&sensor=false
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Selma,%20AL&sensor=false
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Talladaga,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Talladega,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tuscaloosa,%20AL&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eagletown,%20AR&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eldorado,%20AR&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fayetteville,%20AR&sensor=false
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Smith,%20AR&sensor=false
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Little%20Rock,%20AR&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Little
## Rock, AR"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Van%20Buren,%20AR&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Van
## Buren, AR"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20AR&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, AR"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Arivaca,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Arivaca,
## AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Camp%20McDowell,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Camp
## McDowell, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft%20Grant,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft Grant,
## AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Bowie,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Bowie, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Buchanan,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Buchanan, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Crittenden,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Crittenden, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Lowell,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Lowell, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Mojave,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Mojave, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Whipple,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Whipple, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Joseph,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Joseph, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tucson,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tucson,
## AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20AZ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, AZ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alameda,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alameda,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alvarado,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alvarado,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Anaheim,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Anaheim,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Angel%20Island,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Angel
## Island, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Antioch,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Antioch,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Arcata,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Arcata,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Auburn,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Auburn,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bend%20City,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bend
## City, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Benicia,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Benicia,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Benicio,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Benicio,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berkeley,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berkeley,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bodega,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bodega,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Camp%20Gaston,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Camp
## Gaston, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Can%20Carlos,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Can
## Carlos, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cold%20Spring,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cold
## Spring, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cold%20Springs,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cold
## Springs, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Colorna,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Colorna,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbia,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbia,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Colusa,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Colusa,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cooperpolis,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cooperpolis, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Crescent%20City,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Crescent
## City, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Davies,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Davies,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dolores,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dolores,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Downieville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Downieville, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dutch%20Flat,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dutch
## Flat, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=El%20Dorado,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "El
## Dorado, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eureka,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eureka,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fresno,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fresno,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Yuma,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft. Yuma,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grass%20Valley,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grass
## Valley, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hawkin's%20Bar,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hawkin's
## Bar, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Heldsburg,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Heldsburg, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jackson,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jackson,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jenny%20Lind,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jenny
## Lind, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Knight's%20Ferry,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Knight's
## Ferry, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lafayette,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lafayette, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Locklord,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Locklord,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Los%20Angeles,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Los
## Angeles, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marysville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marysville, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Maryville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Maryville, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mattole,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mattole,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mendocino,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mendocino, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Merkleville?,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Merkleville?, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mokelumne%20Hill,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mokelumne
## Hill, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monterey,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Monterey,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=napa,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "napa, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Napa,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Napa, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Napa%20City,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Napa
## City, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nevada%20City,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nevada
## City, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20San%20Juan,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North San
## Juan, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oakland,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oakland,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orange,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orange,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oroville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oroville,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orville,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pacheco,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pacheco,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Petaluma,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Petaluma,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pine%20Grove,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pine
## Grove, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Placerville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Placerville, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Red%20Bluff,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Red
## Bluff, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Redwood%20City,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Redwood
## City, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rio%20Vista,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rio
## Vista, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sacramento,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sacramento, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Andreas,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Andreas, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Antonio,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Antonio, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Bernardino,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Bernardino, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Buenaventura,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Buenaventura, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Diego,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Diego, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Fernando,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Fernando, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Francisco,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Francisco, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Jose,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San Jose,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Juan%20Bautista,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San Juan
## Bautista, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Juan%20Capistrano,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San Juan
## Capistrano, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Lorenzo,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Lorenzo, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Luis%20Obispo,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San Luis
## Obispo, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Luis%20Rey,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San Luis
## Rey, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Quentin,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Quentin, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Rafael,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Rafael, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Raphael,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Raphael, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=San%20Solano,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "San
## Solano, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Santa%20Barbara,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Santa
## Barbara, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Santa%20Clara,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Santa
## Clara, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Santa%20Cruz,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Santa
## Cruz, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Santa%20Ine's,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Santa
## Ine's, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Santa%20Inez,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Santa
## Inez, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Santa%20Rosa,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Santa
## Rosa, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sarcamento,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sarcamento, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sawyer's%20Bar,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sawyer's
## Bar, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Scott%20River,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Scott
## River, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=shasta,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "shasta,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shasta,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Shasta,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Soledad,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Soledad,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sonoma,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sonoma,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sonora,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sonora,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Spanish%20Flat,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Spanish
## Flat, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Louis,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Louis, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stables'%20Ranch,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stables'
## Ranch, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stockton,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stockton,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Suisun,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Suisun,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tomales,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tomales,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ukiah,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ukiah,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Uniontown,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Uniontown, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vacaville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Vacaville, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vallejo,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vallejo,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Visalia,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Visalia,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Volcano,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Volcano,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Watsonville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Watsonville, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Weaverville,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Weaverville, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Whiskey%20Diggings,%20Sierra%20County,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Whiskey
## Diggings, Sierra County, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodland,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woodland,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodside,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woodside,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Yreka,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Yreka,
## CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20CA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, CA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Colorado%20Springs,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Colorado
## Springs, CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Denver,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Denver,
## CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Garland,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Garland, CO"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Lyon,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft. Lyon,
## CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Sedgwick,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Sedgwick, CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Golden,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Golden,
## CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greeley,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Greeley,
## CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greeley%20(Union%20Colony),%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Greeley
## (Union Colony), CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Longmont,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Longmont,
## CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pueblo,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pueblo,
## CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20CO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, CO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Abington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Abington,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ansonia,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ansonia,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ashford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Avon,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Avon, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Barkhamstead,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Barkhamstead, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Barkhamsted,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Barkhamsted, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berlin,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berlin,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bethany,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bethany,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bethel,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bethel,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Birmingham,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Birmingham, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bloomfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bloomfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bolton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bolton,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bozrah,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bozrah,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Branford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Branford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgeport,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgeport, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bristol,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bristol,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brookfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brookfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brooklyn,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brooklyn,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buckingham,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Buckingham, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canaan,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canaan,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canterbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Canterbury, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canton,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chatham,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chatham,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cheshire,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cheshire,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chesire,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chesire,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chester,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chester,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clinton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clinton,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Colchester,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Colchester, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Colebrook,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Colebrook, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbia,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbia,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cornwall,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cornwall,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Coventry,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Coventry,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danbury,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danielsonville,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Danielsonville, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Darien,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Darien,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Derby,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Derby,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Durham,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Durham,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Guilford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Guilford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Haddam,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Haddam, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Hampton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Hampton, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Hartford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Hartford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Haven,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Haven, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Lebanon,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Lebanon, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20River,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## River, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Windsor,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Windsor, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ellington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ellington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Enfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Enfield,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Farmington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Farmington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franklin,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Franklin,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glastonbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Glastonbury, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goshen,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Goshen,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goshen%20and%20Nelson,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Goshen
## and Nelson, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Granby,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Granby,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greens%20Farms,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Greens
## Farms, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenwich,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenwich, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Griswold,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Griswold,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Groton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Groton,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Guildford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Guildford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Guilford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Guilford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Guilford,%20Saybrook,%20Killingworth,%20and%20Lyme,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Guilford,
## Saybrook, Killingworth, and Lyme, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Haddam,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Haddam,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hadlyme,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hadlyme,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hamden,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hamden,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hampton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hampton,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=hartford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "hartford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hartford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hartford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harwinton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Harwinton, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hebron,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hebron,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kensington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Kensington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kent,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kent, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Killingly,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Killingly, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Killingworth,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Killingworth, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lakeville,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lakeville, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lebanon,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lebanon,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ledyard,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ledyard,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lisbon,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lisbon,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Litchfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Litchfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lyme,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lyme, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Madison,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Madison,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mancheser,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mancheser, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mansfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mansfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Meriden,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Meriden,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middle%20Haddam,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Middle
## Haddam, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middlebury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middlebury, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middlefield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middlefield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middletown,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middletown, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Montville,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Montville, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Moodus,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Moodus,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Pleasant,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Pleasant, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Naugatuck,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Naugatuck, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Britain,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Britain, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Cambridge,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Cambridge, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Fairfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Fairfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Hartford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Hartford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Haven,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Haven, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20London,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## London, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Milford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Milford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Preston,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Preston, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Stratford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Stratford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newfield,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Newington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newtown,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newtown,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norfolk,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Norfolk,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Coventry,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Coventry, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Guilford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Guilford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Haven,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Haven, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Killingworth,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Killingworth, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Stonington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Stonington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norwalk,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Norwalk,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norwich,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Norwich,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oxford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oxford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pawcatuck,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pawcatuck, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainville,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainville, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plantsville,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plantsville, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plymouth,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Plymouth,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pomfret,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pomfret,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Poquetanock,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Poquetanock, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Putnam,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Putnam,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Reading,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Reading,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ridgefield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ridgefield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ripon,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ripon,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rocky%20Hill,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rocky
## Hill, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Roxbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Roxbury,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salisbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Salisbury, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saybrook,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saybrook,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Seymour,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Seymour,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sharon,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sharon,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Simsbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Simsbury,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Somers,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Somers,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Conventry,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Conventry, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Manchester,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Manchester, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Southbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Southbury, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Southington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Southington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stafford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stafford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stamford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stamford,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sterling,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sterling,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stonington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Stonington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stratford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Stratford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Suffield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Suffield,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Terryville,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Terryville, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Thomaston,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Thomaston, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Thompson,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Thompson,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tolland,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tolland,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Topsham,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Topsham,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Torrington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Torrington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Voluntown,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Voluntown, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wallingford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wallingford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warren,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warren,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington%20Point,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington Point, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waterbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Waterbury, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Watertown,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Watertown, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wauregan,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wauregan,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Greenwich,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Greenwich, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Hartford,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Hartford, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Haven,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Haven, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Killingly,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Killingly, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Meridan,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Meridan, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Suffield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Suffield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Winsted,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Winsted, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Weston,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Weston,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wethersfield,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wethersfield, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Williamantic,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Williamantic, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Willington,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Willington, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilton,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wilton,
## CT"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Winchester,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Winchester, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Windham,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Windham,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Windsor,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Windsor,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Windsor%20Locks,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Windsor
## Locks, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wolcott,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wolcott,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wolcottville,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wolcottville, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodbridge,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodbridge, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodbury,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woodbury,
## CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodstock,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodstock, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodstock%20and%20Killingly,%20CT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woodstock
## and Killingly, CT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=D.C.,%20DC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "D.C., DC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Georgetown,%20DC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Georgetown, DC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=washington,%20DC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "washington, DC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20DC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, DC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington%20D.C.,%20DC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington D.C., DC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dover,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dover,
## DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Delaware,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Delaware, DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Georgetown,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Georgetown, DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lewes,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lewes,
## DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lincoln,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lincoln,
## DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milton,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milton,
## DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Castle,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Castle, DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newark,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newark,
## DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Odessa,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Odessa,
## DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Smyrna,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Smyrna,
## DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilmington,%20DE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wilmington, DE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chattahoochee,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chattahoochee, FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grand%20Key,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grand
## Key, FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jacksonville,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jacksonville, FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Key%20West,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Key West,
## FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pensacola,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pensacola, FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Augustine,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Augustine, FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tallahasee,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tallahasee, FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Worthington,%20FL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Worthington, FL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Athens,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Athens,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atlanta,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atlanta,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Augusta,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Augusta,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bowden,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bowden,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bowdon,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bowdon,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cassville,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cassville, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cave%20Spring,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cave
## Spring, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cedartown,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cedartown, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbus,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbus,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dahlonega,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dahlonega, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Pulaski,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Pulaski, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greene%20County,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Greene
## County, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenville,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenville, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Griffin,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Griffin,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holton,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holton,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=La%20Grange,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "La
## Grange, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Macon,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Macon,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Medway,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Medway,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milledgeville,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Milledgeville, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oxford,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oxford,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pope's%20Ferry,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pope's
## Ferry, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Savanah,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Savanah,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Savannah,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Savannah,
## GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Point,%20GA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Point, GA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Honolulu,%20HI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Honolulu,
## HI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lahaina,%20HI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lahaina,
## HI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oahu,%20HI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oahu, HI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albia,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Albia,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Almoral,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Almoral,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ames,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ames, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amitx,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amitx,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Anamosa,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Anamosa,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bellevue,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bellevue,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlington,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlington, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cedar%20Falls,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cedar
## Falls, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cedar%20Rapids,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cedar
## Rapids, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chariton,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chariton,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clarinda,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clarinda,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clarksville,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Clarksville, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clinton,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clinton,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Davenport,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Davenport, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Decorah,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Decorah,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Decorsh,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Decorsh,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Denver,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Denver,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Des%20Moines,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Des
## Moines, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dubuque,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dubuque,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Durant,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Durant,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eldora,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eldora,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairfield,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairfield, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fayette,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fayette,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Dodge,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Dodge, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Madison,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Madison, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grinnell,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grinnell,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hamlin,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hamlin,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Humboldt,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Humboldt,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ida,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ida, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Independence,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Independence, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Indianola,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Indianola, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Iowa%20City,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Iowa
## City, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Keokuk,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Keokuk,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Keosanqua,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Keosanqua, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Keosaugua,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Keosaugua, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Little%20Rock,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Little
## Rock, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Logan,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Logan,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lott's%20Creek,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lott's
## Creek, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Low%20Moor,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Low Moor,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lyons,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lyons,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manchester,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Manchester, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Maquoketa,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Maquoketa, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marchalltown,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marchalltown, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marshalltown,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marshalltown, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mason%20City,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mason
## City, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=McGregor,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "McGregor,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=McGuire,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "McGuire,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Miescatine,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Miescatine, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monticello,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Monticello, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Pleasant,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Pleasant, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Vernon,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Vernon, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nevada,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nevada,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Onawa,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Onawa,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Osage,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Osage,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oskaloosa,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Oskaloosa, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oswego,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oswego,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ottumwa,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ottumwa,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pella,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pella,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salem,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salem,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandyville,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sandyville, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sigourney,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sigourney, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sioux%20City,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sioux
## City, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Sebald,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Sebald, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tabor,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tabor,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Trenton,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Trenton,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vinton,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vinton,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waterloo,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waterloo,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waukon,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waukon,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waverly,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waverly,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Point,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Point, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Western%20college,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Western
## college, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Western%20College,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Western
## College, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Western%20College?,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Western
## College?, IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilton,%20IA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wilton,
## IA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boise%20City,%20ID&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Boise
## City, ID"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Boise,%20ID&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Boise, ID"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Hall,%20ID&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft. Hall,
## ID"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Lapwai,%20ID&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Lapwai, ID"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Abingdon,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Abingdon,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albany,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Albany,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albion,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Albion,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alton,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amboy,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amboy,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Anna,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Anna, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Asbley,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Asbley,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atlanta,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atlanta,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atlas,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atlas,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Aurora,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Aurora,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Batavia,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Batavia,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belleville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Belleville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belvidere,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Belvidere, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bement,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bement,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bloomington,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bloomington, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bourbonnais%20Grove,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bourbonnais Grove, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buda,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Buda, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bunker%20Hill,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bunker
## Hill, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bushnell,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bushnell,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cairo,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cairo,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cambridge,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cambridge, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canton,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carbandale,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carbandale, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carbondale,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carbondale, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carlinville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carlinville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carlyle,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carlyle,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carpentersville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carpentersville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carrollton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carrollton, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carthage,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carthage,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cedarville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cedarville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Centralia,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Centralia, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Champaign,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Champaign, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=chicago,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "chicago,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chicago,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chicago,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clay%20City,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clay
## City, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbia,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbia,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danvers,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danvers,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danville,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Decatur,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Decatur,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dixon,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dixon,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Don%20Quoin,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Don
## Quoin, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dwight,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dwight,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=E.%20St.%20Louis,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "E. St.
## Louis, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Earlville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Earlville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Cambridge,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Cambridge, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20St.%20Louis,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East St.
## Louis, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eden,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eden, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Edgington,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Edgington, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Edwardsville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Edwardsville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=El%20Paso,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "El Paso,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elgin,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elgin,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elmhurst,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elmhurst,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elmira,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elmira,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elmore,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elmore,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elmwood,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elmwood,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Erving,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Erving,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ethel,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ethel,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eureka,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eureka,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Evanston,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Evanston,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fayetteville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fayetteville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Flora,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Flora,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Freeburg,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Freeburg,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Freedom,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Freedom,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Freeport,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Freeport,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Friendsville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Friendsville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fulton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fulton,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Galena,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Galena,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Galesburg,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Galesburg, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Galessburg,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Galessburg, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Genesco,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Genesco,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Genesee,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Genesee,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Geneseo,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Geneseo,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Geneva,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Geneva,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gilman,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gilman,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Griggsville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Griggsville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Havana,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Havana,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Highlang,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Highlang,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hillsboro,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hillsboro, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hoopeston,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hoopeston, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hyde%20Park,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hyde
## Park, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Irvington,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Irvington, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jacksonville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jacksonville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Joliet,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Joliet,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Joliet?,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Joliet?,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kankakee,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kankakee,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kaskaskia,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Kaskaskia, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kewanee,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kewanee,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Knoxville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Knoxville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=La%20Salle,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "La Salle,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=LaSalle,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "LaSalle,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lawrence%20County,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lawrence
## County, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lebanon,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lebanon,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leroy,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Leroy,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lewistown?,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lewistown?, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lincoln,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lincoln,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lincoln?,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lincoln?,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Loda,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Loda, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Maroa,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Maroa,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mascoutah,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mascoutah, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Maywood,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Maywood,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=McLeansboro,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "McLeansboro, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mendota,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mendota,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Metamora,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Metamora,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Metropolis,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Metropolis, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Moline,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Moline,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monmouth,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Monmouth,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monticello,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Monticello, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Morgan%20Park,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Morgan
## Park, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Morris,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Morris,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Carroll,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Carroll, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Morris,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Morris, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Carmel,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Carmel, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Vernon,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Vernon, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nashville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Nashville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nauvoo,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nauvoo,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Neponset,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Neponset,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Athens,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Athens, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Normal,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Normal,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Olney,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Olney,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Onarga,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Onarga,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Onargo,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Onargo,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oquawka,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oquawka,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Origon,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Origon,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ottawa,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ottawa,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ouimay?,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ouimay?,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paddock's%20Grove,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paddock's
## Grove, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pana,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pana, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paxton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paxton,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pekin,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pekin,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pekin?,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pekin?,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Peoria,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Peoria,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Peru,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Peru, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Petersburg,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Petersburg, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pittsfield,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pittsfield, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainfield%20/%20Napierville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainfield / Napierville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Polo,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Polo, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pontiac,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pontiac,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Quincy,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Quincy,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Randolph%20County,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Randolph
## County, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rantoul,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rantoul,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Renault,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Renault,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ridge%20Farm,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ridge
## Farm, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Robin's%20Nest,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Robin's
## Nest, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rock%20Island,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rock
## Island, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rockford,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rockford,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Roseville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Roseville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rushville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Rushville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salem,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salem,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salena,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salena,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salina,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salina,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandwich,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sandwich,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Seales%20Mound?,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Seales
## Mound?, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shawneetown,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Shawneetown, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Smithton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Smithton,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sparta,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sparta,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Spring%20Bay,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Spring
## Bay, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springfield,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springfield, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Anne,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St. Anne,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Charles,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Charles, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sterling,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sterling,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Streator,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Streator,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sycamore,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sycamore,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Teutapolis,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Teutapolis, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tiskilwa,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tiskilwa,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tuscola,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tuscola,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Upper%20Alton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Upper
## Alton, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Urbana,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Urbana,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vila%20Ridge,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vila
## Ridge, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Villa%20Ridge,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Villa
## Ridge, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Virginia,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Virginia,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warsaw,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warsaw,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waterloo,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waterloo,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Watseka,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Watseka,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waukegan,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waukegan,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westfield,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westfield, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wheaton,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wheaton,
## IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodstock,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodstock, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Yorkville,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Yorkville, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20IL&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, IL"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Abilene,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Abilene,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atchison,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atchison,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Balwin%20City,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Balwin
## City, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blue%20Rapids,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Blue
## Rapids, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlingame,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlingame, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlington,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlington, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cawker%20City,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cawker
## City, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chetopa%20City,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chetopa
## City, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Coal%20Creek,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Coal
## Creek, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Emporia,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Emporia,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eudora,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eudora,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Riley,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Riley, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Wallace,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Wallace, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Dodge,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Dodge, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Harken,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Harken, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Hays,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft. Hays,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Leavenworth,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Leavenworth, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gardner,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gardner,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Girard,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Girard,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Highland,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Highland,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Junction%20City,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Junction
## City, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Keavenworth,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Keavenworth, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lansing,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lansing,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lawrence,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lawrence,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leavenworth,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Leavenworth, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manhattan,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Manhattan, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marysville,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marysville, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Olathe,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Olathe,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ottawa,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ottawa,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paola,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paola,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Peabody%20Twp.,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Peabody
## Twp., KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Seneca,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Seneca,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Mary's,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Mary's, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Topeka,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Topeka,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vimland,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vimland,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wathena,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wathena,
## KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wyandotte,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wyandotte, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20KS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, KS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashland,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ashland,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Augusta,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Augusta,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bardstown,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bardstown, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berea,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berea,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bowling%20Green,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bowling
## Green, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlington,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlington, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Campbellsville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Campbellsville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carrollton,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carrollton, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carrolton,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carrolton, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Catlettsburg,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Catlettsburg, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cecilian,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cecilian,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clinton,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clinton,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbia,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbia,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Covington,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Covington, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cynthiana,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cynthiana, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danville,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elizabethtown,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Elizabethtown, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eminence,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eminence,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Falmouth,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Falmouth,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Farmdale,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Farmdale,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Frankfort,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Frankfort, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Frankfort?,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Frankfort?, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Frankfurt,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Frankfurt, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fredericksburg,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fredericksburg, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Garnettsville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Garnettsville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Georgetown,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Georgetown, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Germantown,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Germantown, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glascow,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Glascow,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glasgow,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Glasgow,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harrodsburg,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Harrodsburg, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harrodsbury,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Harrodsbury, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Henderson,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Henderson, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hopkinsvile,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hopkinsvile, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hopkinsville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hopkinsville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Howlett,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Howlett,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jeffersontown,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jeffersontown, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lagrange,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lagrange,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lancaster,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lancaster, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lebanon,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lebanon,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leesburg,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Leesburg,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lexington,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lexington, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=London,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "London,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Louisville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Louisville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Louisvillle,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Louisvillle, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Madison,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Madison,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manchester,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Manchester, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Maysville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Maysville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Millersburg,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Millersburg, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Morganfield,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Morganfield, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Sterling,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Sterling, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Vernon,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Vernon, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Sterling,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Sterling, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Munfordsville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Munfordsville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Murray,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Murray,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Near%20Princeton,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Near
## Princeton, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Castle,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Castle, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Liberty,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Liberty, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newport,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newport,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paducah,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paducah,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paintsville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Paintsville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paris,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paris,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pervee?%20Valley,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pervee?
## Valley, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pewee%20Valley,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pewee
## Valley, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Princeton,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Princeton, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rabbit%20Hash,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rabbit
## Hash, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Richmond,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Richmond,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Russellville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Russellville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shelbyville,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Shelbyville, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Union,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Union, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Speedwell,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Speedwell, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springfield,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springfield, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stanford,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stanford,
## KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Versailles,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Versailles, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Winchester,%20KY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Winchester, KY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alexandria,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Alexandria, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Algiers,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Algiers,
## LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Baton%20Rouge,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Baton
## Rouge, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bellview,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bellview,
## LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bringiers,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bringiers, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Donaldsonville,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Donaldsonville, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Pike,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Pike, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franklin,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Franklin,
## LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grand%20Coteau,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grand
## Coteau, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jackson,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jackson,
## LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mansfield,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mansfield, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monroe,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Monroe,
## LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Lebanon,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Lebanon, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=new%20orleans,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "new
## orleans, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Orleans,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Orleans, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Osyka,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Osyka,
## LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20James,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## James, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Thibodaux,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Thibodaux, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20LA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, LA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Abington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Abington,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Adams,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Adams,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amesbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amesbury,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amherst,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amherst,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Andover,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Andover,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Arlington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Arlington, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashburnham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ashburnham, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashby,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ashby,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ashfield,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Athol,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Athol,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Attleboro,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Attleboro, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Attleborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Attleborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Auburn,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Auburn,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ayer,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ayer, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Barnstable,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Barnstable, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Barre,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Barre,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belchertown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Belchertown, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belmont,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Belmont,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berkley,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berkley,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berlin,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berlin,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bernardston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bernardston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Beverly,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Beverly,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Beverly%20Farms,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Beverly
## Farms, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Billerica,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Billerica, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blackinton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Blackinton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blackstone,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Blackstone, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bolton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bolton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Boston,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boxford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Boxford,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boylston%20Centre,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Boylston
## Centre, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bradford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bradford,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Braintree,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Braintree, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brewster,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brewster,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgewater,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgewater, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brighton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brighton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brimfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brimfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brockton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brockton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brookfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brookfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brookline,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brookline, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlington, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cambridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cambridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cambridgeport,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cambridgeport, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canton,
## MA"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carlisle,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carlisle,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charleston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charleston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charlestown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charlestown, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charlton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Charlton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chatham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chatham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chelmsford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chelmsford, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chelsea,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chelsea,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cheshire,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cheshire,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chesterfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chesterfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chicopee,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chicopee,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clinton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clinton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cohasset,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cohasset,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=College%20Hill,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "College
## Hill, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Concord,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Concord,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Conway,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Conway,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cummington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cummington, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Curtisville,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Curtisville, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dalton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dalton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danvers,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danvers,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danversport,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Danversport, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dedham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dedham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Deerfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Deerfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dennis,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dennis,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dighton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dighton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dorchester,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dorchester, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dorchester%20and%20Milton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dorchester and Milton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Douglas,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Douglas,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dover,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dover,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dunstable,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dunstable, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=E.%20Cambridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "E.
## Cambridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Attleboro,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Attleboro, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Boston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Boston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Bridgewater,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Bridgewater, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Cambridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Cambridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Dennis,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Dennis, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Hampton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Hampton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Sudbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Sudbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Walpole,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Walpole, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Easthampton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Easthampton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Easton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Easton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Edgartown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Edgartown, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Erving,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Erving,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Essex,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Essex,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairhaven,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairhaven, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fall%20River,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fall
## River, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Falmouth,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Falmouth,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fells,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fells,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fitchburg,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fitchburg, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fitchburg%20(Worcester%20County),%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fitchburg
## (Worcester County), MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Independence,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Independence, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Foxboro,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Foxboro,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Framingham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Framingham, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franingham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Franingham, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franklin,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Franklin,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Freetown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Freetown,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gardner,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gardner,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Georgetown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Georgetown, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gill,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gill, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Globe%20Village,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Globe
## Village, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gloucester,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Gloucester, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gloucester?,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Gloucester?, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glouchester,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Glouchester, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goshen,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Goshen,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grafton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grafton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Great%20Barrington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Great
## Barrington, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Groton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Groton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Groton%20Centre,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Groton
## Centre, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hadley,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hadley,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hardwick,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hardwick,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harvard,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Harvard,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hatfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hatfield,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hathorne,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hathorne,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Havenhill,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Havenhill, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Haverhill,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Haverhill, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hingham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hingham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hingham%20Centre%20(Plymouth%20County),%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hingham
## Centre (Plymouth County), MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hinsdale,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hinsdale,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holbrook,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holbrook,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holden,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holden,
## MA"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holland,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holland,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holliston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Holliston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holyoke,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holyoke,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hopkinton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hopkinton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Housatonic,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Housatonic, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hubbardston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hubbardston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hudson,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hudson,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hyde%20Park,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hyde
## Park, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ipowich?,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ipowich?,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ipswich,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ipswich,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Iswich,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Iswich,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jamaica%20Plain,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jamaica
## Plain, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kingston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kingston,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lakeville,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lakeville, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lancaster,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lancaster, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lanesborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lanesborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lawrence,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lawrence,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lechmere%20Point,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lechmere
## Point, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lee,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lee, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leicester,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Leicester, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lennox,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lennox,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lenox,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lenox,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leominster,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Leominster, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lexington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lexington, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lincoln,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lincoln,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Littleton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Littleton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Longmeadow,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Longmeadow, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lowell,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lowell,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ludburg,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ludburg,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lunenburg,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lunenburg, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lynn,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lynn, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Malden,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Malden,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manchester,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Manchester, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marblehead,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marblehead, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marion,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Marion,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marlboro,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Marlboro,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marlborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marlborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Medfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Medfield,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Medford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Medford,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Medway,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Medway,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Melrose,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Melrose,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Methuen,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Methuen,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middleborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middleborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middlefield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middlefield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middlesex,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middlesex, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middleton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middleton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milford,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Millbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Millbury,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monson,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Monson,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Montague,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Montague,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nahant,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nahant,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nantucket,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Nantucket, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Natick,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Natick,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Needham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Needham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Bedford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Bedford, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Boston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Boston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newbury,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newburyport,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Newburyport, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newton%20Centre,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newton
## Centre, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newton%20Lower%20Falls,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newton
## Lower Falls, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norfolk,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Norfolk,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Adams,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Adams, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Amherst,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Amherst, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Andover,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Andover, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Attleborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Attleborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Bridgewater,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Bridgewater, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Brookfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Brookfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Chelmsford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Chelmsford, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Danvers,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Danvers, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Reading,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Reading, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Woburn,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Woburn, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Wrentham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Wrentham, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northampton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northampton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northbridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northbridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northhampton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northhampton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Norton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norwook,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Norwook,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oakham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oakham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orange,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orange,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orleans,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orleans,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oxford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oxford,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Palmer,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Palmer,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paxton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paxton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Peabody,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Peabody,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pepperell,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pepperell, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Phillipston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Phillipston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pittsfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pittsfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plymouth,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Plymouth,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Princeton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Princeton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Provincetown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Provincetown, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Quincy,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Quincy,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Randolph,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Randolph,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Reading,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Reading,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Readville,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Readville, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Revere,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Revere,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rhees,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rhees,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Richmond,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Richmond,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rockland,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rockland,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rockport,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rockport,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rowe,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rowe, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rowley,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rowley,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Roxbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Roxbury,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Royalston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Royalston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ruthland,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ruthland,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rutland,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rutland,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salem,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salem,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salisbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Salisbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandisfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sandisfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandwich,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sandwich,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saugus,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saugus,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saultborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Saultborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Scituate,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Scituate,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sheffield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sheffield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shelburne,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Shelburne, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shelburne%20Centre,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Shelburne
## Centre, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sherborn,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sherborn,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shirley,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Shirley,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shrewsbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Shrewsbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Somerville,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Somerville, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Boston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Boston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Chatham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Chatham, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Danvers,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Danvers, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Dedham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Dedham, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Dennis,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Dennis, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Farmington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Farmington, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Gardner,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Gardner, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Hadley,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Hadley, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Natick,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Natick, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Reading,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Reading, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Scituate,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Scituate, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Sudbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Sudbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Yarmouth,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Yarmouth, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Southborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Southborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Southbridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Southbridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Spencer,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Spencer,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springboro,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springboro, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sterling,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sterling,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stockbridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Stockbridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stoneham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stoneham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stoughton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Stoughton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stow,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stow, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sturbridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sturbridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sunderland,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sunderland, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sutton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sutton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Swampscott,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Swampscott, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Swansea,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Swansea,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tannton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tannton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Taunton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Taunton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Templeton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Templeton, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tewksbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tewksbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Topsfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Topsfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Townsend,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Townsend,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tyngsborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tyngsborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Upton,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Upton,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Uxbridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Uxbridge,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vineyard%20Haven,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vineyard
## Haven, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wakefield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wakefield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wales,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wales,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Walpole,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Walpole,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waltham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waltham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ware,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ware, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wareham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wareham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warwick,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warwick,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Watertown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Watertown, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wayland,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wayland,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Webster,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Webster,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wellesley,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wellesley, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wellfleet,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wellfleet, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wendell,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wendell,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wenham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wenham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Boylston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Boylston, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Brookfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Brookfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Cambridge,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Cambridge, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Dennis,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Dennis, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Medway,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Medway, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Newbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Newbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Roxbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Roxbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Scituate,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Scituate, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Springfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Springfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Tisbury,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Tisbury, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westboro,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Westboro,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westborough,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westborough, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westfield,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westfield, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westford,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Westford,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westminster,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westminster, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Weston,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Weston,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Weymouth,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Weymouth,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Whately,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Whately,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Whitinsville,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Whitinsville, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilbraham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wilbraham, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Williamstown,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Williamstown, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilmington,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wilmington, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Winchendon,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Winchendon, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Winchester,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Winchester, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woburn,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woburn,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Worcester,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Worcester, MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wrentham,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wrentham,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Yarmouth,%20MA&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Yarmouth,
## MA"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=All%20Hallows?,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "All
## Hallows?, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ann%20Arundel%20County,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ann
## Arundel County, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Annapolis,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Annapolis, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=baltimore,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "baltimore, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Baltimore,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Baltimore, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Calvert%20Co.,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Calvert
## Co., MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Calvert%20County,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Calvert
## County, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cambridge,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cambridge, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carroll,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carroll,
## MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carrollton,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carrollton, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charles%20County,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Charles
## County, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charlotte%20Hall,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Charlotte
## Hall, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chestertown,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chestertown, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chestertown?,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chestertown?, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Church%20Creek,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Church
## Creek, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=College%20Station,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "College
## Station, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cumberland,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cumberland, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dorchester,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dorchester, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dorchester%20County,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dorchester County, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Durham?,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Durham?,
## MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Easton,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Easton,
## MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ellicot%20City,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ellicot
## City, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ellicott%20City,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ellicott
## City, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ellicott%20Mills,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ellicott
## Mills, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ellicott's%20Mills,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ellicott's Mills, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Emmetsburg,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Emmetsburg, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Emmettsburg,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Emmettsburg, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Frederick,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Frederick, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hagerstown,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hagerstown, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Herring%20Creek,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Herring
## Creek, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ilchester,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ilchester, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kent%20County,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kent
## County, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lonacoming,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lonacoming, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Windsor,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Windsor, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oakland,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oakland,
## MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pickamaxon,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pickamaxon, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rockville,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Rockville, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salisbury,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Salisbury, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandy%20Spring,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sandy
## Spring, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Snow%20Hill?,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Snow
## Hill?, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Somerset,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Somerset,
## MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Somerset%20Co.,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Somerset
## Co., MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20River?,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## River?, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Sassafres?,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Sassafres?, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stepney?,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stepney?,
## MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Talbot%20County,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Talbot
## County, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westminster,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westminster, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodstock,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodstock, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20MD&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, MD"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Acton%20(York%20County),%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Acton
## (York County), ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alfred,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alfred,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Allen's%20Mills,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Allen's
## Mills, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Andover,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Andover,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atkinson,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atkinson,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Auburn,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Auburn,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Augusta,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Augusta,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bangor,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bangor,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bar%20Harbor,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bar
## Harbor, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bath,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bath, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belfast,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Belfast,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bethel,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bethel,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Biddeford,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Biddeford, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Biddleford,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Biddleford, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blue%20Hill,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Blue
## Hill, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bolster's%20Mills,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bolster's
## Mills, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boothbay,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Boothbay,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brewer,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brewer,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bristol,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bristol,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brunswick,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brunswick, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bucksport,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bucksport, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buckstown,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Buckstown, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buxton,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Buxton,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Calais,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Calais,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Camden,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Camden,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cape%20Elizabeth,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cape
## Elizabeth, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Castine,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Castine,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cherryfield,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cherryfield, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chesterville,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chesterville, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Corinna,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Corinna,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cornish,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cornish,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danforth,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danforth,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danville,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danville,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Deering,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Deering,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dexter,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dexter,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dirigo,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dirigo,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dover,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dover,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dresden,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dresden,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Machias,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Machias, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Wilton,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Wilton, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eastbrook,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Eastbrook, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eastport,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eastport,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eliot,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eliot,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ellsworth,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ellsworth, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairfield,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairfield, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Falmouth,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Falmouth,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Farmington,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Farmington, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Preble,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Preble, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Foxcroft,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Foxcroft,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Freeport,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Freeport,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fryeburg,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fryeburg,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gardiner,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gardiner,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gardner,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gardner,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gorham,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gorham,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greathouse?,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greathouse?, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hallowell,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hallowell, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harrison,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Harrison,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Houlton,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Houlton,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kennebunk,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Kennebunk, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kittery,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kittery,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kittery%20and%20York,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kittery
## and York, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lewiston,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lewiston,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lewiston%20and%20Danville,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lewiston
## and Danville, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lewiston%20Falls,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lewiston
## Falls, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lewsiton,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lewsiton,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lisbon,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lisbon,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Livermore,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Livermore, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Machias,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Machias,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Gloucester,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Gloucester, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Sharon,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Sharon, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newport,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newport,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norridgewock,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Norridgewock, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Yarmouth,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Yarmouth, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Norway,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Norway,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orno,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orno, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ossington,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ossington, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paris,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paris,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Parsonsfield,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Parsonsfield, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pembroke,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pembroke,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Portland,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Portland,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Prentiss,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Prentiss,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Presque%20Isle,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Presque
## Isle, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Richmond,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Richmond,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Robbinston,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Robbinston, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rockland,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rockland,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saccarappa,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Saccarappa, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saco,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saco, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saco-Biddeford,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saco-
## Biddeford, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sanford,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sanford,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sangerville,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sangerville, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Searsport,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Searsport, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sedgewick,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sedgewick, ME"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sidney,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sidney,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Skowhegan,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Skowhegan, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Berwick,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Berwick, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Thomaston,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Thomaston, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Togus,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Togus,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Turner,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Turner,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Union,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Union,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waldoboro,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Waldoboro, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waldoboro,%20Warren%20and%20Thomaston,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Waldoboro, Warren and Thomaston, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warren,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warren,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warren%20and%20Thomaston,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warren
## and Thomaston, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washburn,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Washburn,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waterville,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Waterville, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waverly,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waverly,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wayne,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wayne,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wells,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wells,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westbrook,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westbrook, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Winterport,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Winterport, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Winthrop,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Winthrop,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wiscasset,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wiscasset, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Yarmouth,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Yarmouth,
## ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20ME&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, ME"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ada,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ada, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Adams,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Adams,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Addison,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Addison,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Adgansee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Adgansee,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Adrian,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Adrian,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Adrian%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Adrian
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Advian,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Advian,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Akron,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Akron,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alaiedon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alaiedon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alamo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alamo,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albion,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Albion,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albion%20College,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Albion
## College, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Algoma,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Algoma,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Allegan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Allegan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Allen,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Allen,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Allendale,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Allendale, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Allison,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Allison,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alma,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alma, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Almena,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Almena,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Almer,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Almer,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Almont,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Almont,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alpena,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alpena,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alpine,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alpine,
## MI"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amboy,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amboy,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ann%20Arbor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ann
## Arbor, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ann%20Arbor%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ann Arbor
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Antrim,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Antrim,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Antwerp,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Antwerp,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Arbela,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Arbela,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Arcadia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Arcadia,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Argentine,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Argentine, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Arlington,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Arlington, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Armada,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Armada,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ash,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ash, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ashland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Assyria,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Assyria,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Athens,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Athens,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atkins,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atkins,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atlas,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atlas,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Attica,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Attica,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Augusta,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Augusta,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Aurelius,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Aurelius,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Austin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Austin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Avon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Avon, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bainbridge,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bainbridge, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Baltimore,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Baltimore, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bangor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bangor,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bartlett,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bartlett,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Batavia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Batavia,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bath,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bath, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Battle%20Creek,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Battle
## Creek, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bay%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bay City,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bear%20Lake,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bear
## Lake, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bedford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bedford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bellevue,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bellevue,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bengal,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bengal,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bennington,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bennington, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Benona,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Benona,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Benton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Benton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berlin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berlin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berrien,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berrien,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bertrand,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bertrand,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bethany,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bethany,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bethel,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bethel,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Big%20Prairie,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Big
## Prairie, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Big%20Rapids,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Big
## Rapids, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bingham,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bingham,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Birch,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Birch,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Birmingham,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Birmingham, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blackman,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Blackman,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blendon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Blendon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blissfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Blissfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bloomer,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bloomer,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bloomfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bloomfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bloomingdale,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bloomingdale, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blumfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Blumfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boston,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Boston,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bowen%20Mills,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bowen
## Mills, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bowne,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bowne,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brady,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brady,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brant,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brant,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgehampton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgehampton, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgeport,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgeport, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgewater,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgewater, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brighton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brighton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brockway,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brockway,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bronson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bronson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brookfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brookfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brooks,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brooks,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brown,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brownstown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brownstown, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bruce,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bruce,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buchanan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Buchanan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buel,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Buel, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buena,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Buena,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bunkerhill,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bunkerhill, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burch%20Run,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Burch
## Run, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burchville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burchville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlington,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlington, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burns,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Burns,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burnside,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Burnside,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burr,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Burr, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Burton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bushnell,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bushnell,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Butler,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Butler,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Byron,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Byron,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Caledonia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Caledonia, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=California,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "California, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Calumet,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Calumet,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Calvin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Calvin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cambria,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cambria,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cambridge,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cambridge, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Camden,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Camden,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Campbell,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Campbell,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cannon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cannon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Capac,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Capac,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carlton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carlton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carmel,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carmel,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cascade,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cascade,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Casco,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Casco,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Casinovia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Casinovia, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cassopolis,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cassopolis, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Castleton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Castleton, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cato,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cato, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cazenovia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cazenovia, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Centreville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Centreville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charleston,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charleston, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charleviox,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charleviox, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charlotte,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charlotte, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cheshire,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cheshire,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chesseming,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chesseming, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chester,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chester,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chesterfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chesterfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chickaming,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chickaming, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=China,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "China,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chippewa,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chippewa,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clarence,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clarence,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clarendon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Clarendon, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clay,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clay, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clayton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clayton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Climax,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Climax,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clinton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clinton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Coe,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Coe, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cohoctah%20(Cohocta),%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cohoctah
## (Cohocta), MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Coldwater,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Coldwater, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Colon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Colon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbia,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbus,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbus,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Commerce,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Commerce,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Comstock,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Comstock,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Concord,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Concord,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Constantine,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Constantine, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Convis,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Convis,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Conway,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Conway,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cooper,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cooper,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cooper%20Harbor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cooper
## Harbor, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Corunna,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Corunna,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cotterville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cotterville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Courtland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Courtland, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Crockery,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Crockery,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Croton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Croton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Crystal,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Crystal,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dallas,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dallas,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danby,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danby,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Davison,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Davison,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dearborn,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dearborn,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Decatur,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Decatur,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Deerfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Deerfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Delhi,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Delhi,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Delta,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Delta,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Denmark,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Denmark,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Denver,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Denver,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Detriot,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Detriot,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Detroit,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Detroit,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dewitt,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dewitt,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dexter,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dexter,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Donn,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Donn, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dover,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dover,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dowagiac,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dowagiac,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dryden,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dryden,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dundee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dundee,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Duplain,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Duplain,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dwight,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dwight,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eagle,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eagle,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Saginaw,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Saginaw, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Easton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Easton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eaton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eaton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eaton%20Rapids,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eaton
## Rapids, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eckford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eckford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ecorse,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ecorse,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elba,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elba, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elk%20Rapids,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elk
## Rapids, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Emerson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Emerson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Emmet,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Emmet,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ensley,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ensley,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Erie,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Erie, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Erin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Erin, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Essex,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Essex,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Essexville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Essexville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eureka,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eureka,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Everett,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Everett,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Evergreen,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Evergreen, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Exeter,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Exeter,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fabius,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fabius,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fair%20Grove,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fair
## Grove, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairplan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fairplan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Farmington,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Farmington, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fawn%20River,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fawn
## River, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fayette,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fayette,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fenton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fenton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fillmore,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fillmore,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Flint,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Flint,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Flint%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Flint
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Florence,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Florence,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Flowerfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Flowerfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Flushing,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Flushing,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Forest,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Forest,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Forester,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Forester,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Frankenmuth,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Frankenmuth, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Frankfort,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Frankfort, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franklin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Franklin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fredonia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fredonia,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Freedom,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Freedom,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fremon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fremon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fremont,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fremont,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Brady,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Brady, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fulton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fulton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gaines,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gaines,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Galien,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Galien,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ganges,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ganges,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Genesee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Genesee,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Georgetown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Georgetown, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gilead,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gilead,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gilford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gilford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Girard,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Girard,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glen%20Arbor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Glen
## Arbor, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goodland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Goodland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grand%20%20Blanc,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grand
## Blanc, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grand%20Blanc,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grand
## Blanc, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grand%20Rapids,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grand
## Rapids, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grand%20Rapids%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grand
## Rapids City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grass%20Lake,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grass
## Lake, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grattan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grattan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Green,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Green,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Green%20Oak,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Green
## Oak, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenbush,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenbush, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenland, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenwood,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenwood, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grosssepoint,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Grosssepoint, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Groveland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Groveland, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gun%20Plain,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gun
## Plain, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hadley,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hadley,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hagan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hagan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hamburg,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hamburg,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hamilton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hamilton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hampton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hampton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hamtramck,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hamtramck, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hancock,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hancock,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Handy,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Handy,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hanover,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hanover,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harrison,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Harrison,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harrisville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Harrisville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hartford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hartford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hartland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hartland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harvey,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Harvey,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hazleton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hazleton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Heath,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Heath,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Henrietta,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Henrietta, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hickory%20Corners,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hickory
## Corners, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Highland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Highland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hillsdale,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hillsdale, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holland%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holland
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holley,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holley,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holmes,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holmes,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Homer,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Homer,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hope,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hope, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hopkins,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hopkins,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Houghton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Houghton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Howard,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Howard,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Howell,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Howell,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hudson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hudson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Huron,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Huron,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ida,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ida, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Imlay,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Imlay,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Independence,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Independence, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Indian%20Fields,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Indian
## Fields, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ingersoll,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ingersoll, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ingham,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ingham,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ionia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ionia,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Iosco,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Iosco,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ira,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ira, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Irving,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Irving,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ishpeming,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ishpeming, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jackson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jackson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jackson%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jackson
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jamestown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jamestown, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jefferson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jefferson, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jerome,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jerome,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Johnstown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Johnstown, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jonesville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jonesville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Juniatta,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Juniatta,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kalamazoo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Kalamazoo, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kalamo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kalamo,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Keeler,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Keeler,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Keene,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Keene,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kenockee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kenockee,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kimball,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kimball,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kinderhook,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Kinderhook, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=La%20Grange,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "La
## Grange, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lacota,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lacota,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lafayette,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lafayette, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lake,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lake, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lansing,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lansing,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lapeer,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lapeer,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=LaSalle,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "LaSalle,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lawrence,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lawrence,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lebanon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lebanon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lee, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leelanaw,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Leelanaw,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leighton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Leighton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lenox,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lenox,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leoni,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Leoni,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leonidas,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Leonidas,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=LeRoy,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "LeRoy,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Leslie,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Leslie,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lexington,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lexington, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Liberty,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Liberty,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lima,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lima, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lindon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lindon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Litchfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Litchfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Livonia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Livonia,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Locke,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Locke,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lodi,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lodi, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=London,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "London,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lowell,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lowell,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ludington,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ludington, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lynn,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lynn, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lyon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lyon, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lyons,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lyons,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mackinak,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mackinak,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Macomb,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Macomb,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manchester,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Manchester, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manistee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Manistee,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manlius,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Manlius,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Maple%20Grove,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Maple
## Grove, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marathon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Marathon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marcellus,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marcellus, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marengo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Marengo,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marion,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Marion,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marquette,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marquette, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marshall,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Marshall,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Martin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Martin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mason,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mason,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Matteson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Matteson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Medina,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Medina,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Megeezee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Megeezee,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mendon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mendon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Meridian,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Meridian,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Metamora,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Metamora,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middlebury,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middlebury, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Midland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Midland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monguagon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Monguagon, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monroe,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Monroe,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monroe%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Monroe
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Montcalm,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Montcalm,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Monterey,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Monterey,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Montrose,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Montrose,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Moscow,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Moscow,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mottville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mottville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Clemens,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Clemens, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Morris,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Morris, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mundy,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mundy,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Muskegon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Muskegon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mussey,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mussey,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nankin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nankin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Napoleon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Napoleon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Neguanee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Neguanee,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nelson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nelson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Buffalo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Buffalo, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Haven,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Haven, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newark,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newark,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newburgh,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newburgh,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Niles,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Niles,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Niles%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Niles
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Noble,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Noble,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Branch,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Branch, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Plains,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Plains, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Shade,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Shade, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Star,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Star, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northport,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northport, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Novi,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Novi, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oakfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oakfield,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oakland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oakland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oceana,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oceana,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Odessa,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Odessa,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ogden,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ogden,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Olive,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Olive,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Olivet,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Olivet,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oneida,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oneida,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Onondaga,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Onondaga,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ontwa,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ontwa,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orange,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orange,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orangeville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Orangeville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oranokogo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Oranokogo, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orchard%20Lake,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orchard
## Lake, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oregon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oregon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orion,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orion,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orleans,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orleans,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Osceola,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Osceola,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oshtemo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oshtemo,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Otisco,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Otisco,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Otsego,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Otsego,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ottawa,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ottawa,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Overisel,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Overisel,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ovid,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ovid, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Owasso,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Owasso,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Owosso,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Owosso,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oxford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oxford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Palmyra,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Palmyra,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paris,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paris,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Park,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Park, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Parma,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Parma,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pavillion,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pavillion, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Peninsula,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Peninsula, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Penn,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Penn, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pennfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pennfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Perry,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Perry,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pine%20Grove,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pine
## Grove, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pine%20Plains,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pine
## Plains, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pine%20River,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pine
## River, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pipestone,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pipestone, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pittsfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pittsfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pittsford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pittsford, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainwell,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainwell, MI"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plymouth,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Plymouth,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pokagon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pokagon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Polkton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Polkton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pontiac,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pontiac,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Port%20Huron,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Port
## Huron, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Portage,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Portage,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Porter,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Porter,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Portland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Portland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Prairie%20Ronde,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Prairie
## Ronde, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Prairieville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Prairieville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pulaski,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pulaski,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Putnam,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Putnam,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Quincy,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Quincy,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Raisin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Raisin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Raisinville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Raisinville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ransom,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ransom,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ravenna,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ravenna,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ray,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ray, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Reading,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Reading,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Redford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Redford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Richfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Richfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Richland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Richland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Richmond,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Richmond,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ridgeway,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ridgeway,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Riga,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Riga, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Riley,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Riley,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rives,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rives,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Robinson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Robinson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rochester,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Rochester, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rockland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rockland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rodney,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rodney,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rogers,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rogers,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rollin,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rollin,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rome,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rome, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Romulus,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Romulus,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ronald,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ronald,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rose,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rose, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ross,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ross, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Roxand,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Roxand,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Royal%20Oak,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Royal
## Oak, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Royalton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Royalton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rubicon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rubicon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rush,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rush, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rutland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rutland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saginaw,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saginaw,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saginaw%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saginaw
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salem,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salem,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saline,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saline,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sand%20Beach,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sand
## Beach, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandstone,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sandstone, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sanilac,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sanilac,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saulte%20Ste.%20Marie,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saulte
## Ste. Marie, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Schoocraft,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Schoocraft, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Scipio,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Scipio,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sebewaing,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sebewaing, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Seneca,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Seneca,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Seweba,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Seweba,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sharon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sharon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shelby,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Shelby,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sheridan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sheridan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sherman,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sherman,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sherwood,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sherwood,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shiawassee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Shiawassee, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Siddons,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Siddons,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Silver%20Creek,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Silver
## Creek, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Solon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Solon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Somerset,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Somerset,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Haven,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Haven, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Southfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Southfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sparta,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sparta,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Speaker,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Speaker,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Spring%20Arbor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Spring
## Arbor, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Spring%20Lake,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Spring
## Lake, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Spring?,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Spring?,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springport,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springport, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springwells,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springwells, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Charles,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Charles, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Clair,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Clair, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Clair%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St. Clair
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Ignace,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Ignace, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20John's,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## John's, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Joseph,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Joseph, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sterling,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sterling,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stockbridge,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Stockbridge, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stronach,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stronach,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sturgis,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sturgis,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Summerfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Summerfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Summir,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Summir,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sumner,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sumner,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sumpter,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sumpter,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sunfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sunfield,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Superior,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Superior,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sylvan,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sylvan,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tallmadge,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tallmadge, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Taylor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Taylor,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Taymouth,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Taymouth,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tecumseh,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tecumseh,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tekonsha,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tekonsha,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Texas,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Texas,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Thetford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Thetford,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Thomastown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Thomastown, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Thornapple,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Thornapple, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Three%20Oaks,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Three
## Oaks, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Three%20Rivers,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Three
## Rivers, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tittabawassee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tittabawassee, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tompkins,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tompkins,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Traverse,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Traverse,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Traverse%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Traverse
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Trowbridge,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Trowbridge, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Troy,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Troy, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tuscola,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tuscola,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tyrone,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tyrone,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Unadilla,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Unadilla,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Union,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Union,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Union%20City,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Union
## City, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Van%20Buren,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Van
## Buren, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vanderbilt,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Vanderbilt, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Venice,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Venice,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vermontville,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Vermontville, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vernon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vernon,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vevay,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vevay,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Victor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Victor,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vienna,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vienna,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Volinia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Volinia,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wakeshma,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wakeshma,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wales,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wales,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Walker,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Walker,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Walton,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Walton,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warren,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warren,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waterford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Waterford, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waterloo,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waterloo,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Watertown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Watertown, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Watervliet,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Watervliet, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Watson,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Watson,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waverly,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waverly,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wayland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wayland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wayne,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wayne,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Webster,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Webster,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Weesaw,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Weesaw,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Bloomfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Bloomfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westphalia,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westphalia, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wheatfield,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wheatfield, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wheatland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wheatland, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=White%20Lake,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "White
## Lake, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=White%20Oak,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "White
## Oak, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=White%20Pigeon,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "White
## Pigeon, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=White%20River,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "White
## River, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Whiteford,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Whiteford, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Williams,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Williams,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Williamstown,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Williamstown, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Windsor,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Windsor,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wisner,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wisner,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodbridge,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodbridge, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodhull,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woodhull,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woodland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodstock,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodstock, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Worth,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Worth,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wright,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wright,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wyandotte,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wyandotte, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wyoming,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wyoming,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=York,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "York, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ypsilanti,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Ypsilanti, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Zeeland,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Zeeland,
## MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Zilwaukee,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Zilwaukee, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20MI&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, MI"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Anoka,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Anoka,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Austin,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Austin,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Berlin,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Berlin,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blue%20Earth%20City,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Blue
## Earth City, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brainerd,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brainerd,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cambridge,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cambridge, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carlstadt,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carlstadt, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carver,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carver,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chatfrield,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chatfrield, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Collegeville,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Collegeville, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dover%20Center,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dover
## Center, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Duluth,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Duluth,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fabault?,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fabault?,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairbault,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairbault, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairboult,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairboult, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Faribault,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Faribault, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Farmington,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Farmington, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fergus%20Falls,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fergus
## Falls, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fremont,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fremont,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glencoe,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Glencoe,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goodhue,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Goodhue,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grand%20Meadow,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grand
## Meadow, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hastings,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hastings,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hokah,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hokah,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hutchinson,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hutchinson, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jackson,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jackson,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lake%20City,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lake
## City, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lanesboro,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lanesboro, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Litchfield,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Litchfield, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mankato,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mankato,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mantorville,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mantorville, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mininger,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mininger,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Minneapolis,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Minneapolis, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Minnesota%20City,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Minnesota
## City, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Ulm,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New Ulm,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northfield,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northfield, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Owatonna,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Owatonna,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Owatowa,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Owatowa,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainview,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainview, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Preston,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Preston,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Red%20Wing,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Red Wing,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rochester,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Rochester, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rushford,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rushford,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Saint%20Cloud,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Saint
## Cloud, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sauk%20Center,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sauk
## Center, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sibley,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sibley,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Smithfield,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Smithfield, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Spring%20Valley,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Spring
## Valley, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Anthony,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Anthony, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Cloud,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Cloud, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Joseph,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Joseph, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Paul,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St. Paul,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Paul's,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Paul's, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Peter,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Peter, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stillwater,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Stillwater, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Taylor's%20Falls,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Taylor's
## Falls, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Union,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Union,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wabasha,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wabasha,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Waseca,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Waseca,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=White%20Bear,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "White
## Bear, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Winona,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Winona,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Worthington,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Worthington, MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Zumbrota,%20MN&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Zumbrota,
## MN"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Barrens,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Barrens,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boonville,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Boonville, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bowling%20Green,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bowling
## Green, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brunswick,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brunswick, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canton,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canton,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cape%20Girardeau,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cape
## Girardeau, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cape%20Girardequ,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cape
## Girardequ, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carondelet%20City,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carondelet City, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carrollton,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Carrollton, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=College%20Mound,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "College
## Mound, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Columbia,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Columbia,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fayette,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fayette,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franklin,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Franklin,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fulton,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fulton,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glasgow,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Glasgow,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenwood,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenwood, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hannibal,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hannibal,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hillsboro,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hillsboro, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Independence,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Independence, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jefferson%20City,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jefferson
## City, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jefferson?,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jefferson?, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kansas%20City,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kansas
## City, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kidder,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kidder,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=La%20Grange,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "La
## Grange, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lexington,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lexington, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Liberty,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Liberty,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Maryville,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Maryville, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=May%20View,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "May View,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mexico,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mexico,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Moberly,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Moberly,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oregon,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oregon,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Palmyra,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Palmyra,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Parkville,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Parkville, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rolla,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rolla,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sedalia,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sedalia,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springfield,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springfield, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St%20Louis,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St Louis,
## MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Charles,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Charles, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Joseph,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Joseph, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Joseph's,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Joseph's, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=St.%20Louis,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "St.
## Louis, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Troy,%20MO&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Troy, MO"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Aberdeen,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Aberdeen,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Adams,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Adams,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Attala%20County,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Attala
## County, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canton,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canton,
## MS"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clinton,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clinton,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Garlandsville,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Garlandsville, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greene%20County,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Greene
## County, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holly%20Springs,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holly
## Springs, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holy%20Springs,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Holy
## Springs, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jackson,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jackson,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kosciusko,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Kosciusko, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Liberty,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Liberty,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Louisville,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Louisville, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Meridian%20Springs,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Meridian
## Springs, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Natchez,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Natchez,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oakland,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oakland,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oxford,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oxford,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pike,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pike, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pontotoc,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pontotoc,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Port%20Gibson,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Port
## Gibson, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rodney,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rodney,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sharon,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sharon,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springville,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springville, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tchula,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tchula,
## MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodville,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodville, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Yazoo%20City,%20MS&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Yazoo
## City, MS"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Camp%20Baker,%20MT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Camp
## Baker, MT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Ellis,%20MT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Ellis, MT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Shaw,%20MT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft. Shaw,
## MT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Helena,%20MT&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Helena,
## MT"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albemarle?,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Albemarle?, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Asheville,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Asheville, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bath,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bath, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Beaufort,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Beaufort,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brunswick,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brunswick, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cape%20Fear,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cape
## Fear, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chapel%20Hill,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chapel
## Hill, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charlotte,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charlotte, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chowan,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chowan,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Currituck,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Currituck, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Davidson,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Davidson,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Davidson%20County,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Davidson
## County, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Edenton,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Edenton,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Edgecombe,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Edgecombe, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fayeteville,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fayeteville, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fayetteville,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fayetteville, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Forestville,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Forestville, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greensboro,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greensboro, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Guildford,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Guildford, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Guilford,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Guilford,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Happy%20Home,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Happy
## Home, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hillsboro,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hillsboro, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hookerton,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hookerton, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Iredell%20Co.,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Iredell
## Co., NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Iredell%20County,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Iredell
## County, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lenoir,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lenoir,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lincoln%20County,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lincoln
## County, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mechlenberg%20County,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mechlenberg County, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mecklenburg,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Mecklenburg, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Pleasant,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Pleasant, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nazareth,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nazareth,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Garden,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Garden, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Salem,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Salem, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newbern,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newbern,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northampton%20Co.,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northampton Co., NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Olin,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Olin, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oxford,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oxford,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pamplici?,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pamplici?, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pamplier?,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pamplier?, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Person%20County,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Person
## County, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Raleigh,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Raleigh,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Randolph,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Randolph,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Randolph%20Co.,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Randolph
## Co., NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rowan%20County,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rowan
## County, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rowan%20Cty,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rowan
## Cty, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rutherford,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Rutherford, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salem,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salem,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Statesville,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Statesville, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stokes%20Co.,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stokes
## Co., NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Trinity,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Trinity,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wake%20Forest,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wake
## Forest, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Weldon,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Weldon,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Williamsboro,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Williamsboro, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Williamston,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Williamston, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilmington,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wilmington, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilson,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wilson,
## NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20NC&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, NC"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bismark,%20ND&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bismark,
## ND"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fort%20Totten,%20ND&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fort
## Totten, ND"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft%20Badford,%20ND&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft
## Badford, ND"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Stevenson,%20ND&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Stevenson, ND"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brownsville,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brownsville, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brownville,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brownville, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Crete,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Crete,
## NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dakotah%20City,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dakotah
## City, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Falls%20City,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Falls
## City, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fremont,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fremont,
## NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20McPherson,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## McPherson, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Robinson,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Robinson, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lincoln,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lincoln,
## NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nebraska%20City,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nebraska
## City, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Omaha,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Omaha,
## NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Otoe%20County,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Otoe
## County, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20NE&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, NE"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Acworth,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Acworth,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alstead,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alstead,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=amherst,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "amherst,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amherst,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amherst,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Andover,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Andover,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Antrim,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Antrim,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashland,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ashland,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ashuelot,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ashuelot,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Barnstead,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Barnstead, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Barrington,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Barrington, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bath,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bath, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bedford,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bedford,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bethlehem,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bethlehem, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Boscawen,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Boscawen,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bow,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bow, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bradford,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bradford,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brentwood,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brentwood, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgewater,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgewater, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bristol,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bristol,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brookfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brookfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brookline,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brookline, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Campton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Campton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canaan,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canaan,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Candia,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Candia,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canterbury,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Canterbury, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cenre%20Harbor,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cenre
## Harbor, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charleston,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charleston, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charlestown,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charlestown, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cheshire,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cheshire,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chester,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Chester,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chichester,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chichester, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Claremont,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Claremont, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Colebrook%20and%20Monadnock,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Colebrook
## and Monadnock, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Concord,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Concord,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Contoocook,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Contoocook, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Conway%20and%20Bartlett,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Conway
## and Bartlett, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cornish,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cornish,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Corydon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Corydon,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Danbury,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Danbury,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Deerfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Deerfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Deering,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Deering,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Derry,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Derry,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dover,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dover,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dublin,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dublin,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dunbarton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dunbarton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Durham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Durham,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Franklin,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Franklin, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Kingston,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Kingston, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Lebanon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Lebanon, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Rindge,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Rindge, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Eaton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Eaton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Effingham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Effingham, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Enfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Enfield,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Epping,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Epping,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Epsom,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Epsom,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Exeter,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Exeter,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Farmington,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Farmington, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fisherville,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fisherville, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fitzwilliam,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fitzwilliam, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Francestown,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Francestown, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franconia,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Franconia, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franklin,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Franklin,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gilford,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gilford,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gilmanton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Gilmanton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gilsum,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gilsum,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goffstown,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Goffstown, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goshen,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Goshen,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grafton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grafton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grafton%20and%20Danbury,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grafton
## and Danbury, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Grantham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Grantham,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Great%20Falls,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Great
## Falls, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenland,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenland, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Groton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Groton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Groton%20and%20Heben,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Groton
## and Heben, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hampstead,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hampstead, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hampton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hampton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hampton%20Falls,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hampton
## Falls, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hancock,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hancock,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hanover,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hanover,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hanover,%20Lebanon,%20and%20Canaan,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hanover,
## Lebanon, and Canaan, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Haverhill,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Haverhill, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Henniker,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Henniker,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hillsborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hillsborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hinsdale,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hinsdale,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Holderness,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Holderness, NH"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hollis,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hollis,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hopkinton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hopkinton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hudson,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hudson,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jackson,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jackson,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jaffrey,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jaffrey,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Keene,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Keene,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kensington,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Kensington, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kingston,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kingston,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Laconia,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Laconia,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lake%20Village,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lake
## Village, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lancaster,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lancaster, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Landaff,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Landaff,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Langdon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Langdon,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lebanon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lebanon,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lee,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lee, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lempster,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lempster,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lisbon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lisbon,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Litchfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Litchfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Litchfield%20and%20Merrimack,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Litchfield and Merrimack, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Littleton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Littleton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=London,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "London,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Londonderry,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Londonderry, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lyman,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lyman,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lyme,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lyme, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lyndeborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Lyndeborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Manchester,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Manchester, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marlborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Marlborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Marlow,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Marlow,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mason,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mason,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Meredith,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Meredith,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Meriden,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Meriden,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Merrimack,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Merrimack, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middleton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middleton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milford,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milford,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Milton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Milton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Moultonborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Moultonborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Moultonborough%20and%20Sandwich,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Moultonborough and Sandwich, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Vernon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Vernon, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Vernon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Vernon, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nashua,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nashua,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nelson,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Nelson,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Boston,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Boston, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Chester,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Chester, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Durham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Durham, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Hampton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Hampton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Ipswich,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Ipswich, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Ispwich,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Ispwich, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20London,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## London, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Market,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Market, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newington,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Newington, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newport,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newport,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Enfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Enfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Guilford,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Guilford, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=North%20Hampton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "North
## Hampton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Northwood,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Northwood, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Nottingham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Nottingham, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orford,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orford,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ossipee%20and%20Wolfeborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ossipee
## and Wolfeborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Oxford,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Oxford,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Packersfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Packersfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pelham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pelham,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pembroke,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Pembroke,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pemigewasset,%20Peeling,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pemigewasset, Peeling, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Penacook,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Penacook,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Penbroke,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Penbroke,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Peterboro,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Peterboro, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Peterborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Peterborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pittsfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pittsfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plymouth,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Plymouth,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Poplin,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Poplin,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Portsmouth,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Portsmouth, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Richmond,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Richmond,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rindge,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rindge,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rochester,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Rochester, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rumney,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rumney,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rye,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rye, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salem,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salem,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salisbury,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Salisbury, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salmon%20Falls,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salmon
## Falls, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sambornton%20Bridge,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sambornton Bridge, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sanbornton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sanbornton, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sanbornton%20Bridge,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sanbornton Bridge, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sanborton%20Bridge,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sanborton
## Bridge, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandown,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sandown,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sandwich,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sandwich,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Seabrook,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Seabrook,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shaker%20Village,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Shaker
## Village, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shoreham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Shoreham,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Social%20Library,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Social
## Library, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sommersworth,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sommersworth, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Springfield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Springfield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stewartstown,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Stewartstown, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stoddard,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stoddard,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Stratham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Stratham,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sullivan,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sullivan,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Suncook,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Suncook,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Surry,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Surry,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sutton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sutton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Swanzey,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Swanzey,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tamworth,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Tamworth,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Temple,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Temple,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Troy,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Troy, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tuftonborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tuftonborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Turtonborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Turtonborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tyngsborough%20and%20Dunstable,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tyngsborough and Dunstable, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Union,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Union,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Unity,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Unity,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wakefield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wakefield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Walpole,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Walpole,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warner,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warner,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warren,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warren,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Warren%20and%20Wentworth,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Warren
## and Wentworth, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Washington,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Washington, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Weare,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Weare,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wendell,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wendell,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wentworth,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wentworth, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Lebanon,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Lebanon, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Westmoreland,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Westmoreland, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Whitefield,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Whitefield, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wilton,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Wilton,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wincehster,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wincehster, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Windham,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Windham,
## NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wolfborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wolfborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Wolfeborough,%20NH&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Wolfeborough, NH"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Allowaystown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Allowaystown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amboy,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amboy,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amwell,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amwell,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Arneytown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Arneytown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ateo,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ateo, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Atlantic%20City,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Atlantic
## City, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Basking%20Ridge,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Basking
## Ridge, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belvidere,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Belvidere, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Beverly,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Beverly,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bloomfield,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bloomfield, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bordentown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bordentown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bricksburg,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bricksburg, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgeton,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgeton, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Burlington,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Burlington, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Caldwell,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Caldwell,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Camden,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Camden,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cranford,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cranford,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cream%20Ridge,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cream
## Ridge, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dover,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dover,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Egg%20Harbor%20City,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Egg
## Harbor City, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elizabeth,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Elizabeth, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elizabethtown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Elizabethtown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elzizabeth,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Elzizabeth, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Evesham,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Evesham,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fairfield,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Fairfield, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Flemington,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Flemington, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Florence,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Florence,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Forest%20Grove,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Forest
## Grove, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Franklinville,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Franklinville, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Freehold,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Freehold,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenwich,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenwich, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hackensack,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hackensack, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hackettstown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Hackettstown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Haddonfield,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Haddonfield, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hamilton%20Square,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hamilton
## Square, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hancock's%20Bridge,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hancock's
## Bridge, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hardwick,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hardwick,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hoboken,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hoboken,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hopewell,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hopewell,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jamesburg,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Jamesburg, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Jersey%20City,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Jersey
## City, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Kingston,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Kingston,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lakewood,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lakewood,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Livingston,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Livingston, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Lodi,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Lodi, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Madison,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Madison,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Matawan,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Matawan,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mendham,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mendham,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Middlebush,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Middlebush, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Millville,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Millville, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Montclair,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Montclair, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Moorestown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Moorestown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Morrestown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Morrestown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Morristown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Morristown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Holly,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Holly, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mount%20Laurel,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mount
## Laurel, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mt.%20Holly,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mt.
## Holly, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Mullica%20Hill,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Mullica
## Hill, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Brunswick,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Brunswick, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=New%20Market,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "New
## Market, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=newark,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "newark,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newark,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newark,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Newton,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Newton,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Orange,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Orange,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Paterson,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Paterson,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pennington,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pennington, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Perth%20Amboy,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Perth
## Amboy, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Pittsgrove,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Pittsgrove, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Plainfield,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Plainfield, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Princeton,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Princeton, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rahway,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rahway,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Red%20Bank,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Red Bank,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ringoes,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ringoes,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Rockaway,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Rockaway,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Roxbury%20and%20Chester,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Roxbury
## and Chester, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Salem,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Salem,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Scotch%20Plains,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Scotch
## Plains, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sharptown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Sharptown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shiloh,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Shiloh,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Shrewsbury,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Shrewsbury, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Somerville,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Somerville, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Hanover,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Hanover, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Orange,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Orange, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=South%20Vineland,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "South
## Vineland, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Summit,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Summit,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Swedesboro,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Swedesboro, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=trenton,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "trenton,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Trenton,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Trenton,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Tuckerton,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Tuckerton, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Upper%20Greenwich,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Upper
## Greenwich, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Upper%20Penns%20Neck,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Upper
## Penns Neck, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vincentown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Vincentown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Vineland,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Vineland,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=West%20Hoboken,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "West
## Hoboken, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodbridge,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodbridge, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodbury,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Woodbury,
## NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Woodstown,%20NJ&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Woodstown, NJ"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Bayard,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Bayard, NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Craig,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Craig, NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ft.%20Stanton,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ft.
## Stanton, NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Las%20Vegas,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Las
## Vegas, NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Santa%20Fe,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Santa Fe,
## NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Sante%20Fe,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Sante Fe,
## NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Silver%20City,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Silver
## City, NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=NA,%20NM&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "NA, NM"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carlin,%20NV&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carlin,
## NV"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carson%20City,%20NV&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carson
## City, NV"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Gold%20Hill,%20NV&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Gold
## Hill, NV"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Virginia%20City,%20NV&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Virginia
## City, NV"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albany,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Albany,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Albion,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Albion,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alfred,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alfred,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alfred%20Centre,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Alfred
## Centre, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Alleghany,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Alleghany, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Amber,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Amber,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Annandale,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Annandale, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Attica,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Attica,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Auburn,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Auburn,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Aurora,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Aurora,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Ballston,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Ballston,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Batavia,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Batavia,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bath,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bath, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bay%20Ridge,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bay
## Ridge, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Beacon,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Beacon,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bedford,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Bedford,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belleville,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Belleville, NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Belmont,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Belmont,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bennington,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bennington, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Binghampton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Binghampton, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Binghamton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Binghamton, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Binhampton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Binhampton, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Blooming%20Grove,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Blooming
## Grove, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Bridgehampton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Bridgehampton, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brockport,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Brockport, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=brooklyn,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "brooklyn,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Brooklyn,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Brooklyn,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buffalo,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Buffalo,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Buffaol,%20NY&sensor=false
## Warning in readLines(connect, warn = FALSE): cannot open URL
## 'http://maps.googleapis.com/maps/api/geocode/json?address=Buffaol,
## %20NY&sensor=false': HTTP status was '0 (null)'
## Warning in FUN(X[[i]], ...):   geocoding failed for "Buffaol, NY".
##   if accompanied by 500 Internal Server Error with using dsk, try google.
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canandaigua,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Canandaigua, NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canandaigua?,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Canandaigua?, NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canenlaigua,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Canenlaigua, NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Canton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Canton,
## NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Carmel,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Carmel,
## NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Castle%20Creek,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Castle
## Creek, NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Catskill,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Catskill,
## NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Champlain,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Champlain, NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Charleston,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Charleston, NY"
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Chittenago,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Chittenago, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clarkson,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clarkson,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clifton%20Springs,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clifton
## Springs, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Clinton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Clinton,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cohoes,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cohoes,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cohoes?,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cohoes?,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cold%20Spring,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cold
## Spring, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=College%20Point,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "College
## Point, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Collins,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Collins,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Conervango,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Conervango, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cooperstown,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cooperstown, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Corning,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Corning,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cornwall,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cornwall,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cortlandville,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Cortlandville, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Cuba,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Cuba, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dannemora,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Dannemora, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dunkink,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dunkink,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Dunkirk,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Dunkirk,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Hampton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Hampton, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20Maine,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East
## Maine, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=East%20New%20York,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "East New
## York, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elizabethtown?,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Elizabethtown?, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elmira,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elmira,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Elmira?,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Elmira?,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Farmingdale,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Farmingdale, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Flushing,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Flushing,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fonda,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fonda,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fordham,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fordham,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Fredonia,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Fredonia,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Genesee,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Genesee,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Geneseo,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Geneseo,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Geneseo%20Village,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Geneseo
## Village, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Geneva,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Geneva,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Glens%20Falls,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Glens
## Falls, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Goshen,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Goshen,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Governors%20Island,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Governors
## Island, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Greenwich,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Greenwich, NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hamilton,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hamilton,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Harlem,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Harlem,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Hartwick,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Hartwick,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Havana,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location = "Havana,
## NY"
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Henrietta,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Henrietta, NY"
places_combined_b<-geocode(as.character(places_combined_b$location))
## .
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=Herkeimer,%20NY&sensor=false
## Warning: geocode failed with status OVER_QUERY_LIMIT, location =
## "Herkeimer, NY"
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
## query max exceeded, see ?geocode.  current total = 2500
#Bring them back together
placeslatlon<-bind_rows (places_combined_a, places_combined_b)

#Bind locations with the geocoded data
libraries_geocoded<-bind_cols (places_combined, placeslatlon)
write_csv(libraries_geocoded, "~/GitHub/nationallibraries/Data/libraries_geocoded.csv")

libraries_geocoded<-read.csv("~/GitHub/nationallibraries/Data/libraries_geocoded.csv")

#Need to join the table and have the location geocoded data added to the master libraries data.
libupdate<-davies%>%
  left_join(libraries_geocoded, by = c("location" = "location"))
## Warning in left_join_impl(x, y, by$x, by$y, suffix$x, suffix$y): joining
## factor and character vector, coercing into character vector
write_csv(libupdate, "~/GitHub/nationallibraries/Data/libraries_geocoded.csv")
write_csv(libupdate, "~/GitHub/nationallibraries/Data/libupdate.csv")




###Research Day Two

#practice
library(tidyverse)
library(historydata)
library(lubridate)
## 
## Attaching package: 'lubridate'
## The following object is masked from 'package:base':
## 
##     date
library(dplyr)
library(ggplot2)
library (magrittr)
library (knitr)
library (stringr)
library (tidyr)
library (ggmap)
library (USAboundaries)
library(leaflet)

load data

libgeocoded <- read_csv(“/Github/nationallibraries/Data/libupdate.csv“) filter(libgeocoded, founding_date == 1830) libdata = read_csv(”/Github/nationallibraries/Data/libupdate.csv”)

library(ggplot2) data(mpg, package=“ggplot2”) # mpg <- read.csv(“http://goo.gl/uEeRGu”)

Scatterplot

theme_set(theme_bw()) # pre-set the bw theme. g <- ggplot(libgeocoded, aes(state.x, type)) g + geom_count(col=“blue”, show.legend=F) + labs(subtitle=“x”, y=“hwy”, x=“cty”, title=“Counts Plot”)

libdata %>% group_by(type, state.x) %>% summarize(n = n()) %>% ggplot(aes(x=type, y= n, color = type )) + geom_line() + ggtitle(“Libraries X”) + ylab(“Y Stuff”) + xlab(“Year X”) ```