Introduction

Motivation

Air pollution is a critical public health concern, with PM2.5 (fine particulate matter) being one of the most harmful pollutants due to its ability to penetrate deep into the lungs and bloodstream. Numerous studies have highlighted the adverse health impacts of PM2.5, including respiratory and cardiovascular diseases. New York City, with its dense population and varied sources of pollution, offers a unique opportunity to study the dynamics of PM2.5 levels.

While the impacts of PM2.5 on public health are well-documented, there is a need to explore its potential interactions with other emergent public health crises. The COVID-19 pandemic has raised questions about the role of environmental factors, such as air pollution, in exacerbating disease transmission and severity. In this analysis I wanted to examine the relationship between PM2.5 levels and COVID-19 case rates in NYC.

Additionally, I wanted to integrate live PM2.5 levels into this analysis.

Objectives

The primary objectives of this analysis are:

  • PM2.5 Analysis: Analyze historical PM2.5 data in NYC, exploring spatial and temporal variations across neighborhoods.
  • COVID-19 Correlation: Investigate the correlation between PM2.5 levels and COVID-19 case rates to understand potential environmental influences on the pandemic.
  • Real-Time Monitoring: Utilize an API to incorporate live PM2.5 data, providing insights into current air quality levels and their implications.
  • Advanced Analysis:
    • Apply clustering techniques to identify patterns in PM2.5 levels by neighborhood.
    • Explore geospatial relationships between air quality, COVID-19 rates, and neighborhood characteristics.
    • Perform regression analysis to quantify relationships between PM2.5 and health outcomes.

Data Overview

Data Cleaning and Preprocessing

The datasets were merged and cleaned to ensure consistency. Key preprocessing steps include: - Mapping geographic regions using UHF IDs and ZIP codes. - Standardizing units for clustering and regression analysis. - Extracting and formatting time periods for seasonal trends analysis.

Data Loading and Preprocessing

library(readr) 
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(factoextra)
## Welcome! Want to learn more? See two factoextra-related books at https://goo.gl/ve3WBa
library(httr)
library(jsonlite)
library(cluster)
library(leaflet)
library(dplyr)
library(car)
## Loading required package: carData
## 
## Attaching package: 'car'
## The following object is masked from 'package:dplyr':
## 
##     recode
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ stringr   1.5.1
## ✔ lubridate 1.9.3     ✔ tibble    3.2.1
## ✔ purrr     1.0.2     ✔ tidyr     1.3.1
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter()  masks stats::filter()
## ✖ purrr::flatten() masks jsonlite::flatten()
## ✖ dplyr::lag()     masks stats::lag()
## ✖ car::recode()    masks dplyr::recode()
## ✖ purrr::some()    masks car::some()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
covid_caserate_csv <- "data/caserate-by-modzcta.csv"
location_csv <- "data/location.csv"
asthma_emergency_department_visits_PM2.5_csv <- "data/NYC EH Data Portal - Asthma emergency department visits due to PM2.5 (full table).csv"
deaths_pm2.5_csv <- "data/NYC EH Data Portal - Deaths due to PM2.5 (full table).csv"
fine_particles_2.5_csv <- "data/NYC EH Data Portal - Fine particles (PM 2.5) (full table).csv"
respiratory_hospitalizations_2.5_csv <- "data/NYC EH Data Portal - Respiratory hospitalizations due to PM2.5 (age 20+) (full table).csv"
uhf_to_zip_csv <- "data/uhf-to-zip crosswalk.csv"

# Load the CSV file into a data frame
covid_caserate <- read_csv(covid_caserate_csv)
## Rows: 247 Columns: 184
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr   (1): week_ending
## dbl (183): CASERATE_CITY, CASERATE_BX, CASERATE_BK, CASERATE_MN, CASERATE_QN...
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
location <- read_csv(location_csv)
## Rows: 17 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): SiteID, SiteName, Address
## dbl (2): Latitude, Longitude
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
asthma_emergency_department_visits_PM2.5 <- read_csv(asthma_emergency_department_visits_PM2.5_csv)
## Rows: 240 Columns: 9
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): TimePeriod, GeoType, Geography
## dbl (4): GeoID, GeoRank, Estimated annual rate (age 18+) per 100,000 adults,...
## num (2): Estimated annual number (age 18+), Estimated annual number (under a...
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
deaths_pm2.5 <- read_csv(deaths_pm2.5_csv)
## Rows: 240 Columns: 7
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): TimePeriod, GeoType, Geography
## dbl (3): GeoID, GeoRank, Estimated annual rate (age 30+) per 100,000 adults
## num (1): Estimated annual number (age 30+)
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
fine_particles <- read_csv(fine_particles_2.5_csv)
## Rows: 5307 Columns: 8
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): TimePeriod, GeoType, Geography
## dbl (5): GeoID, GeoRank, 10th percentile mcg/m3, 90th percentile mcg/m3, Mea...
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
respiratory_hospitalizations_2.5 <- read_csv(respiratory_hospitalizations_2.5_csv)
## Rows: 240 Columns: 7
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): TimePeriod, GeoType, Geography
## dbl (3): GeoID, GeoRank, Estimated annual rate per 100,000 adults
## num (1): Estimated annual number
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
uhf_to_zip <- read_csv(uhf_to_zip_csv)
## Rows: 42 Columns: 3
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (1): UHF_name
## dbl (1): UHF_id
## num (1): Zipcodes
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
# Merge and preprocess
fine_particles$GeoID <- as.integer(fine_particles$GeoID)
uhf_to_zip$UHF_id <- as.integer(uhf_to_zip$UHF_id)

merged_data <- merge(fine_particles, uhf_to_zip, by.x = "GeoID", by.y = "UHF_id")

grouped_data <- merged_data %>%
  group_by(UHF_name) %>%
  summarise(PM2.5_Mean = mean(`Mean mcg/m3`, na.rm = TRUE)) %>%
  ungroup()

Exploratory Data Analysis (EDA)

PM2.5 Levels Across Regions

# Visualize PM2.5 levels
ggplot(grouped_data, aes(x = reorder(UHF_name, PM2.5_Mean), y = PM2.5_Mean)) +
  geom_bar(stat = "identity", fill = "steelblue") +
  coord_flip() +
  labs(
    title = "Average PM2.5 Levels by UHF Region",
    x = "UHF Region",
    y = "Mean PM2.5 Levels (mcg/m3)"
  ) +
  theme_minimal()

This bar plot presents the average PM2.5 levels (in micrograms per cubic meter) across different UHF (United Hospital Fund) regions in New York City. Each region’s mean PM2.5 concentration was calculated to highlight spatial differences in air quality.

Live Data from API

# Load location data
location_data <- read.csv("data/location.csv")

# Define API token
api_token <- "0e2ae6b3aaff2a0ea81b4baa757e66447608536f"

# Function to fetch PM2.5 data
fetch_pm25 <- function(lat, lng) {
  url <- sprintf("https://api.waqi.info/feed/geo:%f;%f/?token=%s", lat, lng, api_token)
  response <- httr::GET(url)
  if (response$status_code == 200) {
    data <- fromJSON(content(response, as = "text", encoding = "UTF-8"))
    if (data$status == "ok") {
      return(data$data$iaqi$pm25$v)
    }
  }
  return(NA)
}

# Fetch PM2.5 data
location_data <- location_data %>%
  rowwise() %>%
  mutate(PM2.5 = fetch_pm25(Latitude, Longitude))
head(location_data)
## # A tibble: 6 × 6
## # Rowwise: 
##   SiteID       Latitude Longitude SiteName         Address                 PM2.5
##   <chr>           <dbl>     <dbl> <chr>            <chr>                   <int>
## 1 36061NY08454     40.7     -74.0 Manhattan Bridge Canal St SS1E of Eliza…    44
## 2 36005NY11790     40.8     -73.9 Hunts Point      Southeast Corner of Se…    28
## 3 36081NY08198     40.7     -73.9 Glendale         Cooper Rapid Rehousing…    24
## 4 36081NY09285     40.7     -73.8 Queens College   Queens College Referen…    35
## 5 36061NY09734     40.8     -74.0 Broadway/35th St Broadway ES1N of 35th …    44
## 6 36061NY08653     40.7     -74.0 FDR              Southbound FDR access …    44
# Create a map
leaflet(location_data) %>%
  addTiles() %>%
  addCircleMarkers(
    ~Longitude, ~Latitude,
    color = ~ifelse(PM2.5 > 100, "red", "green"),
    popup = ~paste(SiteName, "<br>PM2.5:", PM2.5),
    radius = 5
  )

This section integrates real-time air quality data using the World Air Quality Index (WAQI) API. The script fetches live PM2.5 levels for specified locations and visualizes them on an interactive map.

Correlation and Regression Analysis

# Load datasets
caserate <- read.csv("data/caserate-by-modzcta.csv")
uhf_to_zip <- read.csv("data/uhf-to-zip crosswalk.csv")
respiratory <- read.csv("data/NYC EH Data Portal - Respiratory hospitalizations due to PM2.5 (age 20+) (full table).csv")

# Process UHF-to-Zip Crosswalk
uhf_to_zip <- uhf_to_zip %>%
  separate_rows(Zipcodes, sep = ",") %>% # Split multiple zip codes
  mutate(Zipcodes = as.numeric(Zipcodes)) # Convert Zipcodes to numeric

# Extract ZIP codes from CASERATE columns in the Caserate dataset
caserate_long <- caserate %>%
  pivot_longer(cols = starts_with("CASERATE_"),
               names_to = "ZIP_column",
               values_to = "CaseRate") %>%
  mutate(ZIP = as.numeric(gsub("CASERATE_", "", ZIP_column)))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `ZIP = as.numeric(gsub("CASERATE_", "", ZIP_column))`.
## Caused by warning:
## ! NAs introduced by coercion
# Merge UHF-to-Zip with Caserate Data
caserate_mapped <- caserate_long %>%
  left_join(uhf_to_zip, by = c("ZIP" = "Zipcodes"))

# Clean and Prepare Respiratory Data
respiratory_clean <- respiratory %>%
  rename(Respiratory_Hospitalizations = Estimated.annual.rate.per.100.000.adults) %>%
  select(GeoID, Respiratory_Hospitalizations) %>%
  mutate(GeoID = as.numeric(GeoID))

# Merge Caserate and Respiratory Data
final_data <- caserate_mapped %>%
  left_join(respiratory_clean, by = c("UHF_id" = "GeoID")) %>%
  filter(!is.na(CaseRate) & !is.na(Respiratory_Hospitalizations))
## Warning in left_join(., respiratory_clean, by = c(UHF_id = "GeoID")): Detected an unexpected many-to-many relationship between `x` and `y`.
## ℹ Row 7 of `x` matches multiple rows in `y`.
## ℹ Row 27 of `y` matches multiple rows in `x`.
## ℹ If a many-to-many relationship is expected, set `relationship =
##   "many-to-many"` to silence this warning.
# Perform Correlation Analysis
correlation <- final_data %>%
  summarise(correlation = cor(CaseRate, Respiratory_Hospitalizations, use = "complete.obs"))

print(correlation)
## # A tibble: 1 × 1
##   correlation
##         <dbl>
## 1   0.0000559
write.csv(final_data, "data/processed_data.csv", row.names = FALSE)

# Regression Analysis
regression_model <- lm(Respiratory_Hospitalizations ~ CaseRate, data = final_data)
summary(regression_model)
## 
## Call:
## lm(formula = Respiratory_Hospitalizations ~ CaseRate, data = final_data)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.0121 -3.1104 -0.7104  1.8897 16.4897 
## 
## Coefficients:
##              Estimate Std. Error t value Pr(>|t|)    
## (Intercept) 1.001e+01  1.498e-02 668.021   <2e-16 ***
## CaseRate    6.974e-07  3.610e-05   0.019    0.985    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.621 on 119593 degrees of freedom
## Multiple R-squared:  3.121e-09,  Adjusted R-squared:  -8.359e-06 
## F-statistic: 0.0003733 on 1 and 119593 DF,  p-value: 0.9846
# Q-Q Plot
qqPlot(regression_model, main = "Q-Q Plot")

## [1] 46316 46319
# Residuals vs Fitted Plot
ggplot(data = final_data, aes(x = regression_model$fitted.values, y = regression_model$residuals)) +
  geom_point(alpha = 0.5) +
  geom_hline(yintercept = 0, color = "red", linetype = "dashed") +
  labs(title = "Residuals vs Fitted Values", x = "Fitted Values", y = "Residuals") +
  theme_minimal()

# Scale-Location Plot
ggplot(data = final_data, aes(x = regression_model$fitted.values, y = sqrt(abs(regression_model$residuals)))) +
  geom_point(alpha = 0.5) +
  geom_smooth(method = "loess", color = "blue", se = FALSE) +
  labs(title = "Scale-Location Plot", x = "Fitted Values", y = "Sqrt(|Residuals|)") +
  theme_minimal()
## `geom_smooth()` using formula = 'y ~ x'

# Cook's Distance Plot
cooksd <- cooks.distance(regression_model)
plot(cooksd, type = "h", main = "Cook's Distance", ylab = "Cook's Distance", xlab = "Observation")
abline(h = 4/(nrow(final_data) - length(regression_model$coefficients) - 1), col = "red", lty = 2)

# Histogram of Residuals
hist(regression_model$residuals, breaks = 30, main = "Histogram of Residuals", xlab = "Residuals", col = "skyblue")

The correlation and regression analysis assesses the relationship between PM2.5 levels and public health outcomes, focusing on respiratory hospitalizations and COVID-19 case rates. The QQ plot, residuals vs fitted values plot, scale-location plot, Cook’s distance plot, and histogram of residuals evaluate the model’s assumptions and diagnostics.

The analysis demonstrates that PM2.5 levels alone do not significantly explain respiratory hospitalizations or case rates. Future analyses should explore multivariate models incorporating demographic, socioeconomic, and environmental variables for deeper insights. Additionally, transformations or alternative regression techniques may be necessary to address non-normality and heteroscedasticity.

Regression Analysis Between Asthma Emergency Visits and COVID Case Rates

# Load necessary datasets
asthma_data <- read_csv("data/NYC EH Data Portal - Asthma emergency department visits due to PM2.5 (full table).csv")
## Rows: 240 Columns: 9
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): TimePeriod, GeoType, Geography
## dbl (4): GeoID, GeoRank, Estimated annual rate (age 18+) per 100,000 adults,...
## num (2): Estimated annual number (age 18+), Estimated annual number (under a...
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
# Prepare asthma data (excluding Population column)
asthma_data_clean <- asthma_data %>%
  select(GeoID, `Estimated annual number (age 18+)`, `Estimated annual rate (age 18+) per 100,000 adults`) %>%
  rename(
    Emergency_Visits = `Estimated annual number (age 18+)`,
    Asthma_Rate = `Estimated annual rate (age 18+) per 100,000 adults`
  )

# Merge Caserate and Asthma Data
final_asthma_data <- caserate_mapped %>%
  left_join(asthma_data_clean, by = c("UHF_id" = "GeoID")) %>%
  filter(!is.na(CaseRate) & !is.na(Emergency_Visits))
## Warning in left_join(., asthma_data_clean, by = c(UHF_id = "GeoID")): Detected an unexpected many-to-many relationship between `x` and `y`.
## ℹ Row 7 of `x` matches multiple rows in `y`.
## ℹ Row 27 of `y` matches multiple rows in `x`.
## ℹ If a many-to-many relationship is expected, set `relationship =
##   "many-to-many"` to silence this warning.
# Perform Regression Analysis
asthma_regression_model <- lm(Emergency_Visits ~ CaseRate, data = final_asthma_data)
summary(asthma_regression_model)
## 
## Call:
## lm(formula = Emergency_Visits ~ CaseRate, data = final_asthma_data)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -63.90 -40.73 -19.85  25.78 214.88 
## 
## Coefficients:
##               Estimate Std. Error t value Pr(>|t|)    
## (Intercept) 65.9428126  0.1401563  470.50   <2e-16 ***
## CaseRate    -0.0034247  0.0003376  -10.14   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 55.8 on 199323 degrees of freedom
## Multiple R-squared:  0.000516,   Adjusted R-squared:  0.0005109 
## F-statistic: 102.9 on 1 and 199323 DF,  p-value: < 2.2e-16
# Visualize the Relationship
ggplot(final_asthma_data, aes(x = CaseRate, y = Emergency_Visits)) +
  geom_point() +
  geom_smooth(method = "lm", color = "blue") +
  labs(
    title = "Relationship Between Asthma Emergency Visits and COVID Case Rates",
    x = "COVID Case Rate",
    y = "Asthma Emergency Visits"
  ) +
  theme_minimal()
## `geom_smooth()` using formula = 'y ~ x'

The regression analysis examines the relationship between asthma emergency department visits and COVID-19 case rates. The results show a statistically significant, but very weak, negative relationship (slope = -0.0034, p-value < 2e-16). For every one-unit increase in COVID-19 case rates, asthma emergency visits decrease by 0.0034 on average. The intercept of 65.94 suggests that when COVID-19 case rates are zero, the predicted number of asthma visits is approximately 66. However, the R-squared value is extremely low (0.0005), indicating that COVID-19 case rates explain less than 0.05% of the variability in asthma emergency visits. This suggests that while there is a statistical association, COVID-19 case rates have negligible practical influence on asthma-related emergency visits.

ANOVA Analysis

ANOVA (Analysis of Variance) to compare PM2.5 levels across different regions (UHF regions or ZIP codes) or across time periods (e.g., seasons, years).

Null Hypothesis (H0): The mean PM2.5 levels (or case rates) are the same across groups (e.g., regions or time periods). Alternative Hypothesis (H1): There is a significant difference in means across groups.

# ANOVA for PM2.5 levels by UHF region
anova_model <- aov(PM2.5_Mean ~ UHF_name, data = grouped_data)
summary(anova_model)
##             Df Sum Sq Mean Sq
## UHF_name    41  26.36  0.6428
# Post-hoc test if significant differences exist
TukeyHSD(anova_model)
## Warning in qtukey(conf.level, length(means), x$df.residual): NaNs produced
##   Tukey multiple comparisons of means
##     95% family-wise confidence level
## 
## Fit: aov(formula = PM2.5_Mean ~ UHF_name, data = grouped_data)
## 
## $UHF_name
##                                                                                 diff
## Bedford Stuyvesant - Crown Heights-Bayside - Little Neck                 0.504372019
## Bensonhurst - Bay Ridge-Bayside - Little Neck                            0.072840488
## Borough Park-Bayside - Little Neck                                       0.359326974
## Canarsie - Flatlands-Bayside - Little Neck                              -0.013645999
## Central Harlem - Morningside Heights-Bayside - Little Neck               0.873741388
## Chelsea - Clinton-Bayside - Little Neck                                  1.558823529
## Coney Island - Sheepshead Bay-Bayside - Little Neck                     -0.166799152
## Crotona -Tremont-Bayside - Little Neck                                   2.888235294
## Downtown - Heights - Slope-Bayside - Little Neck                         1.119687334
## East Flatbush - Flatbush-Bayside - Little Neck                           0.353020668
## East Harlem-Bayside - Little Neck                                        0.659326974
## East New York-Bayside - Little Neck                                      0.555723370
## Flushing - Clearview-Bayside - Little Neck                               0.050317965
## Fordham - Bronx Pk-Bayside - Little Neck                                 0.816984632
## Fresh Meadows-Bayside - Little Neck                                     -0.151470588
## Gramercy Park - Murray Hill-Bayside - Little Neck                        1.427941176
## Greenpoint-Bayside - Little Neck                                         1.442209857
## Greenwich Village - SoHo-Bayside - Little Neck                           0.898529412
## High Bridge - Morrisania-Bayside - Little Neck                           1.833823529
## Hunts Point - Mott Haven-Bayside - Little Neck                           0.898529412
## Jamaica-Bayside - Little Neck                                           -0.189321675
## Kingsbridge - Riverdale-Bayside - Little Neck                            1.033200848
## Long Island City - Astoria-Bayside - Little Neck                         0.849417064
## Lower Manhattan-Bayside - Little Neck                                    0.480882353
## Northeast Bronx-Bayside - Little Neck                                    1.072840488
## Pelham - Throgs Neck-Bayside - Little Neck                               1.114281929
## Port Richmond-Bayside - Little Neck                                     -0.344117647
## Ridgewood - Forest Hills-Bayside - Little Neck                           0.222390037
## Rockaways-Bayside - Little Neck                                         -0.792024377
## South Beach - Tottenville-Bayside - Little Neck                         -1.623411765
## Southeast Queens-Bayside - Little Neck                                  -0.332564918
## Southwest Queens-Bayside - Little Neck                                  -0.135267621
## Stapleton - St. George-Bayside - Little Neck                            -0.580882353
## Sunset Park-Bayside - Little Neck                                        0.947615262
## Union Square - Lower East Side-Bayside - Little Neck                     0.576470588
## Upper East Side-Bayside - Little Neck                                    0.410294118
## Upper West Side-Bayside - Little Neck                                    0.855723370
## Washington Heights-Bayside - Little Neck                                 1.097164812
## West Queens-Bayside - Little Neck                                        1.010678325
## Williamsburg - Bushwick-Bayside - Little Neck                            0.716984632
## Willowbrook-Bayside - Little Neck                                       -0.686764706
## Bensonhurst - Bay Ridge-Bedford Stuyvesant - Crown Heights              -0.431531532
## Borough Park-Bedford Stuyvesant - Crown Heights                         -0.145045045
## Canarsie - Flatlands-Bedford Stuyvesant - Crown Heights                 -0.518018018
## Central Harlem - Morningside Heights-Bedford Stuyvesant - Crown Heights  0.369369369
## Chelsea - Clinton-Bedford Stuyvesant - Crown Heights                     1.054451510
## Coney Island - Sheepshead Bay-Bedford Stuyvesant - Crown Heights        -0.671171171
## Crotona -Tremont-Bedford Stuyvesant - Crown Heights                      2.383863275
## Downtown - Heights - Slope-Bedford Stuyvesant - Crown Heights            0.615315315
## East Flatbush - Flatbush-Bedford Stuyvesant - Crown Heights             -0.151351351
## East Harlem-Bedford Stuyvesant - Crown Heights                           0.154954955
## East New York-Bedford Stuyvesant - Crown Heights                         0.051351351
## Flushing - Clearview-Bedford Stuyvesant - Crown Heights                 -0.454054054
## Fordham - Bronx Pk-Bedford Stuyvesant - Crown Heights                    0.312612613
## Fresh Meadows-Bedford Stuyvesant - Crown Heights                        -0.655842607
## Gramercy Park - Murray Hill-Bedford Stuyvesant - Crown Heights           0.923569157
## Greenpoint-Bedford Stuyvesant - Crown Heights                            0.937837838
## Greenwich Village - SoHo-Bedford Stuyvesant - Crown Heights              0.394157393
## High Bridge - Morrisania-Bedford Stuyvesant - Crown Heights              1.329451510
## Hunts Point - Mott Haven-Bedford Stuyvesant - Crown Heights              0.394157393
## Jamaica-Bedford Stuyvesant - Crown Heights                              -0.693693694
## Kingsbridge - Riverdale-Bedford Stuyvesant - Crown Heights               0.528828829
## Long Island City - Astoria-Bedford Stuyvesant - Crown Heights            0.345045045
## Lower Manhattan-Bedford Stuyvesant - Crown Heights                      -0.023489666
## Northeast Bronx-Bedford Stuyvesant - Crown Heights                       0.568468468
## Pelham - Throgs Neck-Bedford Stuyvesant - Crown Heights                  0.609909910
## Port Richmond-Bedford Stuyvesant - Crown Heights                        -0.848489666
## Ridgewood - Forest Hills-Bedford Stuyvesant - Crown Heights             -0.281981982
## Rockaways-Bedford Stuyvesant - Crown Heights                            -1.296396396
## South Beach - Tottenville-Bedford Stuyvesant - Crown Heights            -2.127783784
## Southeast Queens-Bedford Stuyvesant - Crown Heights                     -0.836936937
## Southwest Queens-Bedford Stuyvesant - Crown Heights                     -0.639639640
## Stapleton - St. George-Bedford Stuyvesant - Crown Heights               -1.085254372
## Sunset Park-Bedford Stuyvesant - Crown Heights                           0.443243243
## Union Square - Lower East Side-Bedford Stuyvesant - Crown Heights        0.072098569
## Upper East Side-Bedford Stuyvesant - Crown Heights                      -0.094077901
## Upper West Side-Bedford Stuyvesant - Crown Heights                       0.351351351
## Washington Heights-Bedford Stuyvesant - Crown Heights                    0.592792793
## West Queens-Bedford Stuyvesant - Crown Heights                           0.506306306
## Williamsburg - Bushwick-Bedford Stuyvesant - Crown Heights               0.212612613
## Willowbrook-Bedford Stuyvesant - Crown Heights                          -1.191136725
## Borough Park-Bensonhurst - Bay Ridge                                     0.286486486
## Canarsie - Flatlands-Bensonhurst - Bay Ridge                            -0.086486486
## Central Harlem - Morningside Heights-Bensonhurst - Bay Ridge             0.800900901
## Chelsea - Clinton-Bensonhurst - Bay Ridge                                1.485983042
## Coney Island - Sheepshead Bay-Bensonhurst - Bay Ridge                   -0.239639640
## Crotona -Tremont-Bensonhurst - Bay Ridge                                 2.815394807
## Downtown - Heights - Slope-Bensonhurst - Bay Ridge                       1.046846847
## East Flatbush - Flatbush-Bensonhurst - Bay Ridge                         0.280180180
## East Harlem-Bensonhurst - Bay Ridge                                      0.586486486
## East New York-Bensonhurst - Bay Ridge                                    0.482882883
## Flushing - Clearview-Bensonhurst - Bay Ridge                            -0.022522523
## Fordham - Bronx Pk-Bensonhurst - Bay Ridge                               0.744144144
## Fresh Meadows-Bensonhurst - Bay Ridge                                   -0.224311076
## Gramercy Park - Murray Hill-Bensonhurst - Bay Ridge                      1.355100689
## Greenpoint-Bensonhurst - Bay Ridge                                       1.369369369
## Greenwich Village - SoHo-Bensonhurst - Bay Ridge                         0.825688924
## High Bridge - Morrisania-Bensonhurst - Bay Ridge                         1.760983042
## Hunts Point - Mott Haven-Bensonhurst - Bay Ridge                         0.825688924
## Jamaica-Bensonhurst - Bay Ridge                                         -0.262162162
## Kingsbridge - Riverdale-Bensonhurst - Bay Ridge                          0.960360360
## Long Island City - Astoria-Bensonhurst - Bay Ridge                       0.776576577
## Lower Manhattan-Bensonhurst - Bay Ridge                                  0.408041865
## Northeast Bronx-Bensonhurst - Bay Ridge                                  1.000000000
## Pelham - Throgs Neck-Bensonhurst - Bay Ridge                             1.041441441
## Port Richmond-Bensonhurst - Bay Ridge                                   -0.416958135
## Ridgewood - Forest Hills-Bensonhurst - Bay Ridge                         0.149549550
## Rockaways-Bensonhurst - Bay Ridge                                       -0.864864865
## South Beach - Tottenville-Bensonhurst - Bay Ridge                       -1.696252252
## Southeast Queens-Bensonhurst - Bay Ridge                                -0.405405405
## Southwest Queens-Bensonhurst - Bay Ridge                                -0.208108108
## Stapleton - St. George-Bensonhurst - Bay Ridge                          -0.653722840
## Sunset Park-Bensonhurst - Bay Ridge                                      0.874774775
## Union Square - Lower East Side-Bensonhurst - Bay Ridge                   0.503630101
## Upper East Side-Bensonhurst - Bay Ridge                                  0.337453630
## Upper West Side-Bensonhurst - Bay Ridge                                  0.782882883
## Washington Heights-Bensonhurst - Bay Ridge                               1.024324324
## West Queens-Bensonhurst - Bay Ridge                                      0.937837838
## Williamsburg - Bushwick-Bensonhurst - Bay Ridge                          0.644144144
## Willowbrook-Bensonhurst - Bay Ridge                                     -0.759605193
## Canarsie - Flatlands-Borough Park                                       -0.372972973
## Central Harlem - Morningside Heights-Borough Park                        0.514414414
## Chelsea - Clinton-Borough Park                                           1.199496555
## Coney Island - Sheepshead Bay-Borough Park                              -0.526126126
## Crotona -Tremont-Borough Park                                            2.528908320
## Downtown - Heights - Slope-Borough Park                                  0.760360360
## East Flatbush - Flatbush-Borough Park                                   -0.006306306
## East Harlem-Borough Park                                                 0.300000000
## East New York-Borough Park                                               0.196396396
## Flushing - Clearview-Borough Park                                       -0.309009009
## Fordham - Bronx Pk-Borough Park                                          0.457657658
## Fresh Meadows-Borough Park                                              -0.510797562
## Gramercy Park - Murray Hill-Borough Park                                 1.068614202
## Greenpoint-Borough Park                                                  1.082882883
## Greenwich Village - SoHo-Borough Park                                    0.539202438
## High Bridge - Morrisania-Borough Park                                    1.474496555
## Hunts Point - Mott Haven-Borough Park                                    0.539202438
## Jamaica-Borough Park                                                    -0.548648649
## Kingsbridge - Riverdale-Borough Park                                     0.673873874
## Long Island City - Astoria-Borough Park                                  0.490090090
## Lower Manhattan-Borough Park                                             0.121555379
## Northeast Bronx-Borough Park                                             0.713513514
## Pelham - Throgs Neck-Borough Park                                        0.754954955
## Port Richmond-Borough Park                                              -0.703444621
## Ridgewood - Forest Hills-Borough Park                                   -0.136936937
## Rockaways-Borough Park                                                  -1.151351351
## South Beach - Tottenville-Borough Park                                  -1.982738739
## Southeast Queens-Borough Park                                           -0.691891892
## Southwest Queens-Borough Park                                           -0.494594595
## Stapleton - St. George-Borough Park                                     -0.940209327
## Sunset Park-Borough Park                                                 0.588288288
## Union Square - Lower East Side-Borough Park                              0.217143614
## Upper East Side-Borough Park                                             0.050967144
## Upper West Side-Borough Park                                             0.496396396
## Washington Heights-Borough Park                                          0.737837838
## West Queens-Borough Park                                                 0.651351351
## Williamsburg - Bushwick-Borough Park                                     0.357657658
## Willowbrook-Borough Park                                                -1.046091680
## Central Harlem - Morningside Heights-Canarsie - Flatlands                0.887387387
## Chelsea - Clinton-Canarsie - Flatlands                                   1.572469528
## Coney Island - Sheepshead Bay-Canarsie - Flatlands                      -0.153153153
## Crotona -Tremont-Canarsie - Flatlands                                    2.901881293
## Downtown - Heights - Slope-Canarsie - Flatlands                          1.133333333
## East Flatbush - Flatbush-Canarsie - Flatlands                            0.366666667
## East Harlem-Canarsie - Flatlands                                         0.672972973
## East New York-Canarsie - Flatlands                                       0.569369369
## Flushing - Clearview-Canarsie - Flatlands                                0.063963964
## Fordham - Bronx Pk-Canarsie - Flatlands                                  0.830630631
## Fresh Meadows-Canarsie - Flatlands                                      -0.137824589
## Gramercy Park - Murray Hill-Canarsie - Flatlands                         1.441587175
## Greenpoint-Canarsie - Flatlands                                          1.455855856
## Greenwich Village - SoHo-Canarsie - Flatlands                            0.912175411
## High Bridge - Morrisania-Canarsie - Flatlands                            1.847469528
## Hunts Point - Mott Haven-Canarsie - Flatlands                            0.912175411
## Jamaica-Canarsie - Flatlands                                            -0.175675676
## Kingsbridge - Riverdale-Canarsie - Flatlands                             1.046846847
## Long Island City - Astoria-Canarsie - Flatlands                          0.863063063
## Lower Manhattan-Canarsie - Flatlands                                     0.494528352
## Northeast Bronx-Canarsie - Flatlands                                     1.086486486
## Pelham - Throgs Neck-Canarsie - Flatlands                                1.127927928
## Port Richmond-Canarsie - Flatlands                                      -0.330471648
## Ridgewood - Forest Hills-Canarsie - Flatlands                            0.236036036
## Rockaways-Canarsie - Flatlands                                          -0.778378378
## South Beach - Tottenville-Canarsie - Flatlands                          -1.609765766
## Southeast Queens-Canarsie - Flatlands                                   -0.318918919
## Southwest Queens-Canarsie - Flatlands                                   -0.121621622
## Stapleton - St. George-Canarsie - Flatlands                             -0.567236354
## Sunset Park-Canarsie - Flatlands                                         0.961261261
## Union Square - Lower East Side-Canarsie - Flatlands                      0.590116587
## Upper East Side-Canarsie - Flatlands                                     0.423940117
## Upper West Side-Canarsie - Flatlands                                     0.869369369
## Washington Heights-Canarsie - Flatlands                                  1.110810811
## West Queens-Canarsie - Flatlands                                         1.024324324
## Williamsburg - Bushwick-Canarsie - Flatlands                             0.730630631
## Willowbrook-Canarsie - Flatlands                                        -0.673118707
## Chelsea - Clinton-Central Harlem - Morningside Heights                   0.685082141
## Coney Island - Sheepshead Bay-Central Harlem - Morningside Heights      -1.040540541
## Crotona -Tremont-Central Harlem - Morningside Heights                    2.014493906
## Downtown - Heights - Slope-Central Harlem - Morningside Heights          0.245945946
## East Flatbush - Flatbush-Central Harlem - Morningside Heights           -0.520720721
## East Harlem-Central Harlem - Morningside Heights                        -0.214414414
## East New York-Central Harlem - Morningside Heights                      -0.318018018
## Flushing - Clearview-Central Harlem - Morningside Heights               -0.823423423
## Fordham - Bronx Pk-Central Harlem - Morningside Heights                 -0.056756757
## Fresh Meadows-Central Harlem - Morningside Heights                      -1.025211977
## Gramercy Park - Murray Hill-Central Harlem - Morningside Heights         0.554199788
## Greenpoint-Central Harlem - Morningside Heights                          0.568468468
## Greenwich Village - SoHo-Central Harlem - Morningside Heights            0.024788023
## High Bridge - Morrisania-Central Harlem - Morningside Heights            0.960082141
## Hunts Point - Mott Haven-Central Harlem - Morningside Heights            0.024788023
## Jamaica-Central Harlem - Morningside Heights                            -1.063063063
## Kingsbridge - Riverdale-Central Harlem - Morningside Heights             0.159459459
## Long Island City - Astoria-Central Harlem - Morningside Heights         -0.024324324
## Lower Manhattan-Central Harlem - Morningside Heights                    -0.392859036
## Northeast Bronx-Central Harlem - Morningside Heights                     0.199099099
## Pelham - Throgs Neck-Central Harlem - Morningside Heights                0.240540541
## Port Richmond-Central Harlem - Morningside Heights                      -1.217859036
## Ridgewood - Forest Hills-Central Harlem - Morningside Heights           -0.651351351
## Rockaways-Central Harlem - Morningside Heights                          -1.665765766
## South Beach - Tottenville-Central Harlem - Morningside Heights          -2.497153153
## Southeast Queens-Central Harlem - Morningside Heights                   -1.206306306
## Southwest Queens-Central Harlem - Morningside Heights                   -1.009009009
## Stapleton - St. George-Central Harlem - Morningside Heights             -1.454623741
## Sunset Park-Central Harlem - Morningside Heights                         0.073873874
## Union Square - Lower East Side-Central Harlem - Morningside Heights     -0.297270800
## Upper East Side-Central Harlem - Morningside Heights                    -0.463447271
## Upper West Side-Central Harlem - Morningside Heights                    -0.018018018
## Washington Heights-Central Harlem - Morningside Heights                  0.223423423
## West Queens-Central Harlem - Morningside Heights                         0.136936937
## Williamsburg - Bushwick-Central Harlem - Morningside Heights            -0.156756757
## Willowbrook-Central Harlem - Morningside Heights                        -1.560506094
## Coney Island - Sheepshead Bay-Chelsea - Clinton                         -1.725622682
## Crotona -Tremont-Chelsea - Clinton                                       1.329411765
## Downtown - Heights - Slope-Chelsea - Clinton                            -0.439136195
## East Flatbush - Flatbush-Chelsea - Clinton                              -1.205802862
## East Harlem-Chelsea - Clinton                                           -0.899496555
## East New York-Chelsea - Clinton                                         -1.003100159
## Flushing - Clearview-Chelsea - Clinton                                  -1.508505564
## Fordham - Bronx Pk-Chelsea - Clinton                                    -0.741838898
## Fresh Meadows-Chelsea - Clinton                                         -1.710294118
## Gramercy Park - Murray Hill-Chelsea - Clinton                           -0.130882353
## Greenpoint-Chelsea - Clinton                                            -0.116613672
## Greenwich Village - SoHo-Chelsea - Clinton                              -0.660294118
## High Bridge - Morrisania-Chelsea - Clinton                               0.275000000
## Hunts Point - Mott Haven-Chelsea - Clinton                              -0.660294118
## Jamaica-Chelsea - Clinton                                               -1.748145204
## Kingsbridge - Riverdale-Chelsea - Clinton                               -0.525622682
## Long Island City - Astoria-Chelsea - Clinton                            -0.709406465
## Lower Manhattan-Chelsea - Clinton                                       -1.077941176
## Northeast Bronx-Chelsea - Clinton                                       -0.485983042
## Pelham - Throgs Neck-Chelsea - Clinton                                  -0.444541600
## Port Richmond-Chelsea - Clinton                                         -1.902941176
## Ridgewood - Forest Hills-Chelsea - Clinton                              -1.336433492
## Rockaways-Chelsea - Clinton                                             -2.350847907
## South Beach - Tottenville-Chelsea - Clinton                             -3.182235294
## Southeast Queens-Chelsea - Clinton                                      -1.891388447
## Southwest Queens-Chelsea - Clinton                                      -1.694091150
## Stapleton - St. George-Chelsea - Clinton                                -2.139705882
## Sunset Park-Chelsea - Clinton                                           -0.611208267
## Union Square - Lower East Side-Chelsea - Clinton                        -0.982352941
## Upper East Side-Chelsea - Clinton                                       -1.148529412
## Upper West Side-Chelsea - Clinton                                       -0.703100159
## Washington Heights-Chelsea - Clinton                                    -0.461658718
## West Queens-Chelsea - Clinton                                           -0.548145204
## Williamsburg - Bushwick-Chelsea - Clinton                               -0.841838898
## Willowbrook-Chelsea - Clinton                                           -2.245588235
## Crotona -Tremont-Coney Island - Sheepshead Bay                           3.055034446
## Downtown - Heights - Slope-Coney Island - Sheepshead Bay                 1.286486486
## East Flatbush - Flatbush-Coney Island - Sheepshead Bay                   0.519819820
## East Harlem-Coney Island - Sheepshead Bay                                0.826126126
## East New York-Coney Island - Sheepshead Bay                              0.722522523
## Flushing - Clearview-Coney Island - Sheepshead Bay                       0.217117117
## Fordham - Bronx Pk-Coney Island - Sheepshead Bay                         0.983783784
## Fresh Meadows-Coney Island - Sheepshead Bay                              0.015328564
## Gramercy Park - Murray Hill-Coney Island - Sheepshead Bay                1.594740329
## Greenpoint-Coney Island - Sheepshead Bay                                 1.609009009
## Greenwich Village - SoHo-Coney Island - Sheepshead Bay                   1.065328564
## High Bridge - Morrisania-Coney Island - Sheepshead Bay                   2.000622682
## Hunts Point - Mott Haven-Coney Island - Sheepshead Bay                   1.065328564
## Jamaica-Coney Island - Sheepshead Bay                                   -0.022522523
## Kingsbridge - Riverdale-Coney Island - Sheepshead Bay                    1.200000000
## Long Island City - Astoria-Coney Island - Sheepshead Bay                 1.016216216
## Lower Manhattan-Coney Island - Sheepshead Bay                            0.647681505
## Northeast Bronx-Coney Island - Sheepshead Bay                            1.239639640
## Pelham - Throgs Neck-Coney Island - Sheepshead Bay                       1.281081081
## Port Richmond-Coney Island - Sheepshead Bay                             -0.177318495
## Ridgewood - Forest Hills-Coney Island - Sheepshead Bay                   0.389189189
## Rockaways-Coney Island - Sheepshead Bay                                 -0.625225225
## South Beach - Tottenville-Coney Island - Sheepshead Bay                 -1.456612613
## Southeast Queens-Coney Island - Sheepshead Bay                          -0.165765766
## Southwest Queens-Coney Island - Sheepshead Bay                           0.031531532
## Stapleton - St. George-Coney Island - Sheepshead Bay                    -0.414083201
## Sunset Park-Coney Island - Sheepshead Bay                                1.114414414
## Union Square - Lower East Side-Coney Island - Sheepshead Bay             0.743269740
## Upper East Side-Coney Island - Sheepshead Bay                            0.577093270
## Upper West Side-Coney Island - Sheepshead Bay                            1.022522523
## Washington Heights-Coney Island - Sheepshead Bay                         1.263963964
## West Queens-Coney Island - Sheepshead Bay                                1.177477477
## Williamsburg - Bushwick-Coney Island - Sheepshead Bay                    0.883783784
## Willowbrook-Coney Island - Sheepshead Bay                               -0.519965554
## Downtown - Heights - Slope-Crotona -Tremont                             -1.768547960
## East Flatbush - Flatbush-Crotona -Tremont                               -2.535214626
## East Harlem-Crotona -Tremont                                            -2.228908320
## East New York-Crotona -Tremont                                          -2.332511924
## Flushing - Clearview-Crotona -Tremont                                   -2.837917329
## Fordham - Bronx Pk-Crotona -Tremont                                     -2.071250662
## Fresh Meadows-Crotona -Tremont                                          -3.039705882
## Gramercy Park - Murray Hill-Crotona -Tremont                            -1.460294118
## Greenpoint-Crotona -Tremont                                             -1.446025437
## Greenwich Village - SoHo-Crotona -Tremont                               -1.989705882
## High Bridge - Morrisania-Crotona -Tremont                               -1.054411765
## Hunts Point - Mott Haven-Crotona -Tremont                               -1.989705882
## Jamaica-Crotona -Tremont                                                -3.077556969
## Kingsbridge - Riverdale-Crotona -Tremont                                -1.855034446
## Long Island City - Astoria-Crotona -Tremont                             -2.038818230
## Lower Manhattan-Crotona -Tremont                                        -2.407352941
## Northeast Bronx-Crotona -Tremont                                        -1.815394807
## Pelham - Throgs Neck-Crotona -Tremont                                   -1.773953365
## Port Richmond-Crotona -Tremont                                          -3.232352941
## Ridgewood - Forest Hills-Crotona -Tremont                               -2.665845257
## Rockaways-Crotona -Tremont                                              -3.680259671
## South Beach - Tottenville-Crotona -Tremont                              -4.511647059
## Southeast Queens-Crotona -Tremont                                       -3.220800212
## Southwest Queens-Crotona -Tremont                                       -3.023502915
## Stapleton - St. George-Crotona -Tremont                                 -3.469117647
## Sunset Park-Crotona -Tremont                                            -1.940620032
## Union Square - Lower East Side-Crotona -Tremont                         -2.311764706
## Upper East Side-Crotona -Tremont                                        -2.477941176
## Upper West Side-Crotona -Tremont                                        -2.032511924
## Washington Heights-Crotona -Tremont                                     -1.791070482
## West Queens-Crotona -Tremont                                            -1.877556969
## Williamsburg - Bushwick-Crotona -Tremont                                -2.171250662
## Willowbrook-Crotona -Tremont                                            -3.575000000
## East Flatbush - Flatbush-Downtown - Heights - Slope                     -0.766666667
## East Harlem-Downtown - Heights - Slope                                  -0.460360360
## East New York-Downtown - Heights - Slope                                -0.563963964
## Flushing - Clearview-Downtown - Heights - Slope                         -1.069369369
## Fordham - Bronx Pk-Downtown - Heights - Slope                           -0.302702703
## Fresh Meadows-Downtown - Heights - Slope                                -1.271157923
## Gramercy Park - Murray Hill-Downtown - Heights - Slope                   0.308253842
## Greenpoint-Downtown - Heights - Slope                                    0.322522523
## Greenwich Village - SoHo-Downtown - Heights - Slope                     -0.221157923
## High Bridge - Morrisania-Downtown - Heights - Slope                      0.714136195
## Hunts Point - Mott Haven-Downtown - Heights - Slope                     -0.221157923
## Jamaica-Downtown - Heights - Slope                                      -1.309009009
## Kingsbridge - Riverdale-Downtown - Heights - Slope                      -0.086486486
## Long Island City - Astoria-Downtown - Heights - Slope                   -0.270270270
## Lower Manhattan-Downtown - Heights - Slope                              -0.638804981
## Northeast Bronx-Downtown - Heights - Slope                              -0.046846847
## Pelham - Throgs Neck-Downtown - Heights - Slope                         -0.005405405
## Port Richmond-Downtown - Heights - Slope                                -1.463804981
## Ridgewood - Forest Hills-Downtown - Heights - Slope                     -0.897297297
## Rockaways-Downtown - Heights - Slope                                    -1.911711712
## South Beach - Tottenville-Downtown - Heights - Slope                    -2.743099099
## Southeast Queens-Downtown - Heights - Slope                             -1.452252252
## Southwest Queens-Downtown - Heights - Slope                             -1.254954955
## Stapleton - St. George-Downtown - Heights - Slope                       -1.700569687
## Sunset Park-Downtown - Heights - Slope                                  -0.172072072
## Union Square - Lower East Side-Downtown - Heights - Slope               -0.543216746
## Upper East Side-Downtown - Heights - Slope                              -0.709393217
## Upper West Side-Downtown - Heights - Slope                              -0.263963964
## Washington Heights-Downtown - Heights - Slope                           -0.022522523
## West Queens-Downtown - Heights - Slope                                  -0.109009009
## Williamsburg - Bushwick-Downtown - Heights - Slope                      -0.402702703
## Willowbrook-Downtown - Heights - Slope                                  -1.806452040
## East Harlem-East Flatbush - Flatbush                                     0.306306306
## East New York-East Flatbush - Flatbush                                   0.202702703
## Flushing - Clearview-East Flatbush - Flatbush                           -0.302702703
## Fordham - Bronx Pk-East Flatbush - Flatbush                              0.463963964
## Fresh Meadows-East Flatbush - Flatbush                                  -0.504491256
## Gramercy Park - Murray Hill-East Flatbush - Flatbush                     1.074920509
## Greenpoint-East Flatbush - Flatbush                                      1.089189189
## Greenwich Village - SoHo-East Flatbush - Flatbush                        0.545508744
## High Bridge - Morrisania-East Flatbush - Flatbush                        1.480802862
## Hunts Point - Mott Haven-East Flatbush - Flatbush                        0.545508744
## Jamaica-East Flatbush - Flatbush                                        -0.542342342
## Kingsbridge - Riverdale-East Flatbush - Flatbush                         0.680180180
## Long Island City - Astoria-East Flatbush - Flatbush                      0.496396396
## Lower Manhattan-East Flatbush - Flatbush                                 0.127861685
## Northeast Bronx-East Flatbush - Flatbush                                 0.719819820
## Pelham - Throgs Neck-East Flatbush - Flatbush                            0.761261261
## Port Richmond-East Flatbush - Flatbush                                  -0.697138315
## Ridgewood - Forest Hills-East Flatbush - Flatbush                       -0.130630631
## Rockaways-East Flatbush - Flatbush                                      -1.145045045
## South Beach - Tottenville-East Flatbush - Flatbush                      -1.976432432
## Southeast Queens-East Flatbush - Flatbush                               -0.685585586
## Southwest Queens-East Flatbush - Flatbush                               -0.488288288
## Stapleton - St. George-East Flatbush - Flatbush                         -0.933903021
## Sunset Park-East Flatbush - Flatbush                                     0.594594595
## Union Square - Lower East Side-East Flatbush - Flatbush                  0.223449921
## Upper East Side-East Flatbush - Flatbush                                 0.057273450
## Upper West Side-East Flatbush - Flatbush                                 0.502702703
## Washington Heights-East Flatbush - Flatbush                              0.744144144
## West Queens-East Flatbush - Flatbush                                     0.657657658
## Williamsburg - Bushwick-East Flatbush - Flatbush                         0.363963964
## Willowbrook-East Flatbush - Flatbush                                    -1.039785374
## East New York-East Harlem                                               -0.103603604
## Flushing - Clearview-East Harlem                                        -0.609009009
## Fordham - Bronx Pk-East Harlem                                           0.157657658
## Fresh Meadows-East Harlem                                               -0.810797562
## Gramercy Park - Murray Hill-East Harlem                                  0.768614202
## Greenpoint-East Harlem                                                   0.782882883
## Greenwich Village - SoHo-East Harlem                                     0.239202438
## High Bridge - Morrisania-East Harlem                                     1.174496555
## Hunts Point - Mott Haven-East Harlem                                     0.239202438
## Jamaica-East Harlem                                                     -0.848648649
## Kingsbridge - Riverdale-East Harlem                                      0.373873874
## Long Island City - Astoria-East Harlem                                   0.190090090
## Lower Manhattan-East Harlem                                             -0.178444621
## Northeast Bronx-East Harlem                                              0.413513514
## Pelham - Throgs Neck-East Harlem                                         0.454954955
## Port Richmond-East Harlem                                               -1.003444621
## Ridgewood - Forest Hills-East Harlem                                    -0.436936937
## Rockaways-East Harlem                                                   -1.451351351
## South Beach - Tottenville-East Harlem                                   -2.282738739
## Southeast Queens-East Harlem                                            -0.991891892
## Southwest Queens-East Harlem                                            -0.794594595
## Stapleton - St. George-East Harlem                                      -1.240209327
## Sunset Park-East Harlem                                                  0.288288288
## Union Square - Lower East Side-East Harlem                              -0.082856386
## Upper East Side-East Harlem                                             -0.249032856
## Upper West Side-East Harlem                                              0.196396396
## Washington Heights-East Harlem                                           0.437837838
## West Queens-East Harlem                                                  0.351351351
## Williamsburg - Bushwick-East Harlem                                      0.057657658
## Willowbrook-East Harlem                                                 -1.346091680
## Flushing - Clearview-East New York                                      -0.505405405
## Fordham - Bronx Pk-East New York                                         0.261261261
## Fresh Meadows-East New York                                             -0.707193959
## Gramercy Park - Murray Hill-East New York                                0.872217806
## Greenpoint-East New York                                                 0.886486486
## Greenwich Village - SoHo-East New York                                   0.342806041
## High Bridge - Morrisania-East New York                                   1.278100159
## Hunts Point - Mott Haven-East New York                                   0.342806041
## Jamaica-East New York                                                   -0.745045045
## Kingsbridge - Riverdale-East New York                                    0.477477477
## Long Island City - Astoria-East New York                                 0.293693694
## Lower Manhattan-East New York                                           -0.074841017
## Northeast Bronx-East New York                                            0.517117117
## Pelham - Throgs Neck-East New York                                       0.558558559
## Port Richmond-East New York                                             -0.899841017
## Ridgewood - Forest Hills-East New York                                  -0.333333333
## Rockaways-East New York                                                 -1.347747748
## South Beach - Tottenville-East New York                                 -2.179135135
## Southeast Queens-East New York                                          -0.888288288
## Southwest Queens-East New York                                          -0.690990991
## Stapleton - St. George-East New York                                    -1.136605723
## Sunset Park-East New York                                                0.391891892
## Union Square - Lower East Side-East New York                             0.020747218
## Upper East Side-East New York                                           -0.145429253
## Upper West Side-East New York                                            0.300000000
## Washington Heights-East New York                                         0.541441441
## West Queens-East New York                                                0.454954955
## Williamsburg - Bushwick-East New York                                    0.161261261
## Willowbrook-East New York                                               -1.242488076
## Fordham - Bronx Pk-Flushing - Clearview                                  0.766666667
## Fresh Meadows-Flushing - Clearview                                      -0.201788553
## Gramercy Park - Murray Hill-Flushing - Clearview                         1.377623211
## Greenpoint-Flushing - Clearview                                          1.391891892
## Greenwich Village - SoHo-Flushing - Clearview                            0.848211447
## High Bridge - Morrisania-Flushing - Clearview                            1.783505564
## Hunts Point - Mott Haven-Flushing - Clearview                            0.848211447
## Jamaica-Flushing - Clearview                                            -0.239639640
## Kingsbridge - Riverdale-Flushing - Clearview                             0.982882883
## Long Island City - Astoria-Flushing - Clearview                          0.799099099
## Lower Manhattan-Flushing - Clearview                                     0.430564388
## Northeast Bronx-Flushing - Clearview                                     1.022522523
## Pelham - Throgs Neck-Flushing - Clearview                                1.063963964
## Port Richmond-Flushing - Clearview                                      -0.394435612
## Ridgewood - Forest Hills-Flushing - Clearview                            0.172072072
## Rockaways-Flushing - Clearview                                          -0.842342342
## South Beach - Tottenville-Flushing - Clearview                          -1.673729730
## Southeast Queens-Flushing - Clearview                                   -0.382882883
## Southwest Queens-Flushing - Clearview                                   -0.185585586
## Stapleton - St. George-Flushing - Clearview                             -0.631200318
## Sunset Park-Flushing - Clearview                                         0.897297297
## Union Square - Lower East Side-Flushing - Clearview                      0.526152623
## Upper East Side-Flushing - Clearview                                     0.359976153
## Upper West Side-Flushing - Clearview                                     0.805405405
## Washington Heights-Flushing - Clearview                                  1.046846847
## West Queens-Flushing - Clearview                                         0.960360360
## Williamsburg - Bushwick-Flushing - Clearview                             0.666666667
## Willowbrook-Flushing - Clearview                                        -0.737082671
## Fresh Meadows-Fordham - Bronx Pk                                        -0.968455220
## Gramercy Park - Murray Hill-Fordham - Bronx Pk                           0.610956545
## Greenpoint-Fordham - Bronx Pk                                            0.625225225
## Greenwich Village - SoHo-Fordham - Bronx Pk                              0.081544780
## High Bridge - Morrisania-Fordham - Bronx Pk                              1.016838898
## Hunts Point - Mott Haven-Fordham - Bronx Pk                              0.081544780
## Jamaica-Fordham - Bronx Pk                                              -1.006306306
## Kingsbridge - Riverdale-Fordham - Bronx Pk                               0.216216216
## Long Island City - Astoria-Fordham - Bronx Pk                            0.032432432
## Lower Manhattan-Fordham - Bronx Pk                                      -0.336102279
## Northeast Bronx-Fordham - Bronx Pk                                       0.255855856
## Pelham - Throgs Neck-Fordham - Bronx Pk                                  0.297297297
## Port Richmond-Fordham - Bronx Pk                                        -1.161102279
## Ridgewood - Forest Hills-Fordham - Bronx Pk                             -0.594594595
## Rockaways-Fordham - Bronx Pk                                            -1.609009009
## South Beach - Tottenville-Fordham - Bronx Pk                            -2.440396396
## Southeast Queens-Fordham - Bronx Pk                                     -1.149549550
## Southwest Queens-Fordham - Bronx Pk                                     -0.952252252
## Stapleton - St. George-Fordham - Bronx Pk                               -1.397866985
## Sunset Park-Fordham - Bronx Pk                                           0.130630631
## Union Square - Lower East Side-Fordham - Bronx Pk                       -0.240514043
## Upper East Side-Fordham - Bronx Pk                                      -0.406690514
## Upper West Side-Fordham - Bronx Pk                                       0.038738739
## Washington Heights-Fordham - Bronx Pk                                    0.280180180
## West Queens-Fordham - Bronx Pk                                           0.193693694
## Williamsburg - Bushwick-Fordham - Bronx Pk                              -0.100000000
## Willowbrook-Fordham - Bronx Pk                                          -1.503749338
## Gramercy Park - Murray Hill-Fresh Meadows                                1.579411765
## Greenpoint-Fresh Meadows                                                 1.593680445
## Greenwich Village - SoHo-Fresh Meadows                                   1.050000000
## High Bridge - Morrisania-Fresh Meadows                                   1.985294118
## Hunts Point - Mott Haven-Fresh Meadows                                   1.050000000
## Jamaica-Fresh Meadows                                                   -0.037851086
## Kingsbridge - Riverdale-Fresh Meadows                                    1.184671436
## Long Island City - Astoria-Fresh Meadows                                 1.000887652
## Lower Manhattan-Fresh Meadows                                            0.632352941
## Northeast Bronx-Fresh Meadows                                            1.224311076
## Pelham - Throgs Neck-Fresh Meadows                                       1.265752517
## Port Richmond-Fresh Meadows                                             -0.192647059
## Ridgewood - Forest Hills-Fresh Meadows                                   0.373860625
## Rockaways-Fresh Meadows                                                 -0.640553789
## South Beach - Tottenville-Fresh Meadows                                 -1.471941176
## Southeast Queens-Fresh Meadows                                          -0.181094330
## Southwest Queens-Fresh Meadows                                           0.016202968
## Stapleton - St. George-Fresh Meadows                                    -0.429411765
## Sunset Park-Fresh Meadows                                                1.099085851
## Union Square - Lower East Side-Fresh Meadows                             0.727941176
## Upper East Side-Fresh Meadows                                            0.561764706
## Upper West Side-Fresh Meadows                                            1.007193959
## Washington Heights-Fresh Meadows                                         1.248635400
## West Queens-Fresh Meadows                                                1.162148914
## Williamsburg - Bushwick-Fresh Meadows                                    0.868455220
## Willowbrook-Fresh Meadows                                               -0.535294118
## Greenpoint-Gramercy Park - Murray Hill                                   0.014268680
## Greenwich Village - SoHo-Gramercy Park - Murray Hill                    -0.529411765
## High Bridge - Morrisania-Gramercy Park - Murray Hill                     0.405882353
## Hunts Point - Mott Haven-Gramercy Park - Murray Hill                    -0.529411765
## Jamaica-Gramercy Park - Murray Hill                                     -1.617262851
## Kingsbridge - Riverdale-Gramercy Park - Murray Hill                     -0.394740329
## Long Island City - Astoria-Gramercy Park - Murray Hill                  -0.578524112
## Lower Manhattan-Gramercy Park - Murray Hill                             -0.947058824
## Northeast Bronx-Gramercy Park - Murray Hill                             -0.355100689
## Pelham - Throgs Neck-Gramercy Park - Murray Hill                        -0.313659247
## Port Richmond-Gramercy Park - Murray Hill                               -1.772058824
## Ridgewood - Forest Hills-Gramercy Park - Murray Hill                    -1.205551139
## Rockaways-Gramercy Park - Murray Hill                                   -2.219965554
## South Beach - Tottenville-Gramercy Park - Murray Hill                   -3.051352941
## Southeast Queens-Gramercy Park - Murray Hill                            -1.760506094
## Southwest Queens-Gramercy Park - Murray Hill                            -1.563208797
## Stapleton - St. George-Gramercy Park - Murray Hill                      -2.008823529
## Sunset Park-Gramercy Park - Murray Hill                                 -0.480325914
## Union Square - Lower East Side-Gramercy Park - Murray Hill              -0.851470588
## Upper East Side-Gramercy Park - Murray Hill                             -1.017647059
## Upper West Side-Gramercy Park - Murray Hill                             -0.572217806
## Washington Heights-Gramercy Park - Murray Hill                          -0.330776365
## West Queens-Gramercy Park - Murray Hill                                 -0.417262851
## Williamsburg - Bushwick-Gramercy Park - Murray Hill                     -0.710956545
## Willowbrook-Gramercy Park - Murray Hill                                 -2.114705882
## Greenwich Village - SoHo-Greenpoint                                     -0.543680445
## High Bridge - Morrisania-Greenpoint                                      0.391613672
## Hunts Point - Mott Haven-Greenpoint                                     -0.543680445
## Jamaica-Greenpoint                                                      -1.631531532
## Kingsbridge - Riverdale-Greenpoint                                      -0.409009009
## Long Island City - Astoria-Greenpoint                                   -0.592792793
## Lower Manhattan-Greenpoint                                              -0.961327504
## Northeast Bronx-Greenpoint                                              -0.369369369
## Pelham - Throgs Neck-Greenpoint                                         -0.327927928
## Port Richmond-Greenpoint                                                -1.786327504
## Ridgewood - Forest Hills-Greenpoint                                     -1.219819820
## Rockaways-Greenpoint                                                    -2.234234234
## South Beach - Tottenville-Greenpoint                                    -3.065621622
## Southeast Queens-Greenpoint                                             -1.774774775
## Southwest Queens-Greenpoint                                             -1.577477477
## Stapleton - St. George-Greenpoint                                       -2.023092210
## Sunset Park-Greenpoint                                                  -0.494594595
## Union Square - Lower East Side-Greenpoint                               -0.865739269
## Upper East Side-Greenpoint                                              -1.031915739
## Upper West Side-Greenpoint                                              -0.586486486
## Washington Heights-Greenpoint                                           -0.345045045
## West Queens-Greenpoint                                                  -0.431531532
## Williamsburg - Bushwick-Greenpoint                                      -0.725225225
## Willowbrook-Greenpoint                                                  -2.128974563
## High Bridge - Morrisania-Greenwich Village - SoHo                        0.935294118
## Hunts Point - Mott Haven-Greenwich Village - SoHo                        0.000000000
## Jamaica-Greenwich Village - SoHo                                        -1.087851086
## Kingsbridge - Riverdale-Greenwich Village - SoHo                         0.134671436
## Long Island City - Astoria-Greenwich Village - SoHo                     -0.049112348
## Lower Manhattan-Greenwich Village - SoHo                                -0.417647059
## Northeast Bronx-Greenwich Village - SoHo                                 0.174311076
## Pelham - Throgs Neck-Greenwich Village - SoHo                            0.215752517
## Port Richmond-Greenwich Village - SoHo                                  -1.242647059
## Ridgewood - Forest Hills-Greenwich Village - SoHo                       -0.676139375
## Rockaways-Greenwich Village - SoHo                                      -1.690553789
## South Beach - Tottenville-Greenwich Village - SoHo                      -2.521941176
## Southeast Queens-Greenwich Village - SoHo                               -1.231094330
## Southwest Queens-Greenwich Village - SoHo                               -1.033797032
## Stapleton - St. George-Greenwich Village - SoHo                         -1.479411765
## Sunset Park-Greenwich Village - SoHo                                     0.049085851
## Union Square - Lower East Side-Greenwich Village - SoHo                 -0.322058824
## Upper East Side-Greenwich Village - SoHo                                -0.488235294
## Upper West Side-Greenwich Village - SoHo                                -0.042806041
## Washington Heights-Greenwich Village - SoHo                              0.198635400
## West Queens-Greenwich Village - SoHo                                     0.112148914
## Williamsburg - Bushwick-Greenwich Village - SoHo                        -0.181544780
## Willowbrook-Greenwich Village - SoHo                                    -1.585294118
## Hunts Point - Mott Haven-High Bridge - Morrisania                       -0.935294118
## Jamaica-High Bridge - Morrisania                                        -2.023145204
## Kingsbridge - Riverdale-High Bridge - Morrisania                        -0.800622682
## Long Island City - Astoria-High Bridge - Morrisania                     -0.984406465
## Lower Manhattan-High Bridge - Morrisania                                -1.352941176
## Northeast Bronx-High Bridge - Morrisania                                -0.760983042
## Pelham - Throgs Neck-High Bridge - Morrisania                           -0.719541600
## Port Richmond-High Bridge - Morrisania                                  -2.177941176
## Ridgewood - Forest Hills-High Bridge - Morrisania                       -1.611433492
## Rockaways-High Bridge - Morrisania                                      -2.625847907
## South Beach - Tottenville-High Bridge - Morrisania                      -3.457235294
## Southeast Queens-High Bridge - Morrisania                               -2.166388447
## Southwest Queens-High Bridge - Morrisania                               -1.969091150
## Stapleton - St. George-High Bridge - Morrisania                         -2.414705882
## Sunset Park-High Bridge - Morrisania                                    -0.886208267
## Union Square - Lower East Side-High Bridge - Morrisania                 -1.257352941
## Upper East Side-High Bridge - Morrisania                                -1.423529412
## Upper West Side-High Bridge - Morrisania                                -0.978100159
## Washington Heights-High Bridge - Morrisania                             -0.736658718
## West Queens-High Bridge - Morrisania                                    -0.823145204
## Williamsburg - Bushwick-High Bridge - Morrisania                        -1.116838898
## Willowbrook-High Bridge - Morrisania                                    -2.520588235
## Jamaica-Hunts Point - Mott Haven                                        -1.087851086
## Kingsbridge - Riverdale-Hunts Point - Mott Haven                         0.134671436
## Long Island City - Astoria-Hunts Point - Mott Haven                     -0.049112348
## Lower Manhattan-Hunts Point - Mott Haven                                -0.417647059
## Northeast Bronx-Hunts Point - Mott Haven                                 0.174311076
## Pelham - Throgs Neck-Hunts Point - Mott Haven                            0.215752517
## Port Richmond-Hunts Point - Mott Haven                                  -1.242647059
## Ridgewood - Forest Hills-Hunts Point - Mott Haven                       -0.676139375
## Rockaways-Hunts Point - Mott Haven                                      -1.690553789
## South Beach - Tottenville-Hunts Point - Mott Haven                      -2.521941176
## Southeast Queens-Hunts Point - Mott Haven                               -1.231094330
## Southwest Queens-Hunts Point - Mott Haven                               -1.033797032
## Stapleton - St. George-Hunts Point - Mott Haven                         -1.479411765
## Sunset Park-Hunts Point - Mott Haven                                     0.049085851
## Union Square - Lower East Side-Hunts Point - Mott Haven                 -0.322058824
## Upper East Side-Hunts Point - Mott Haven                                -0.488235294
## Upper West Side-Hunts Point - Mott Haven                                -0.042806041
## Washington Heights-Hunts Point - Mott Haven                              0.198635400
## West Queens-Hunts Point - Mott Haven                                     0.112148914
## Williamsburg - Bushwick-Hunts Point - Mott Haven                        -0.181544780
## Willowbrook-Hunts Point - Mott Haven                                    -1.585294118
## Kingsbridge - Riverdale-Jamaica                                          1.222522523
## Long Island City - Astoria-Jamaica                                       1.038738739
## Lower Manhattan-Jamaica                                                  0.670204028
## Northeast Bronx-Jamaica                                                  1.262162162
## Pelham - Throgs Neck-Jamaica                                             1.303603604
## Port Richmond-Jamaica                                                   -0.154795972
## Ridgewood - Forest Hills-Jamaica                                         0.411711712
## Rockaways-Jamaica                                                       -0.602702703
## South Beach - Tottenville-Jamaica                                       -1.434090090
## Southeast Queens-Jamaica                                                -0.143243243
## Southwest Queens-Jamaica                                                 0.054054054
## Stapleton - St. George-Jamaica                                          -0.391560678
## Sunset Park-Jamaica                                                      1.136936937
## Union Square - Lower East Side-Jamaica                                   0.765792263
## Upper East Side-Jamaica                                                  0.599615792
## Upper West Side-Jamaica                                                  1.045045045
## Washington Heights-Jamaica                                               1.286486486
## West Queens-Jamaica                                                      1.200000000
## Williamsburg - Bushwick-Jamaica                                          0.906306306
## Willowbrook-Jamaica                                                     -0.497443031
## Long Island City - Astoria-Kingsbridge - Riverdale                      -0.183783784
## Lower Manhattan-Kingsbridge - Riverdale                                 -0.552318495
## Northeast Bronx-Kingsbridge - Riverdale                                  0.039639640
## Pelham - Throgs Neck-Kingsbridge - Riverdale                             0.081081081
## Port Richmond-Kingsbridge - Riverdale                                   -1.377318495
## Ridgewood - Forest Hills-Kingsbridge - Riverdale                        -0.810810811
## Rockaways-Kingsbridge - Riverdale                                       -1.825225225
## South Beach - Tottenville-Kingsbridge - Riverdale                       -2.656612613
## Southeast Queens-Kingsbridge - Riverdale                                -1.365765766
## Southwest Queens-Kingsbridge - Riverdale                                -1.168468468
## Stapleton - St. George-Kingsbridge - Riverdale                          -1.614083201
## Sunset Park-Kingsbridge - Riverdale                                     -0.085585586
## Union Square - Lower East Side-Kingsbridge - Riverdale                  -0.456730260
## Upper East Side-Kingsbridge - Riverdale                                 -0.622906730
## Upper West Side-Kingsbridge - Riverdale                                 -0.177477477
## Washington Heights-Kingsbridge - Riverdale                               0.063963964
## West Queens-Kingsbridge - Riverdale                                     -0.022522523
## Williamsburg - Bushwick-Kingsbridge - Riverdale                         -0.316216216
## Willowbrook-Kingsbridge - Riverdale                                     -1.719965554
## Lower Manhattan-Long Island City - Astoria                              -0.368534711
## Northeast Bronx-Long Island City - Astoria                               0.223423423
## Pelham - Throgs Neck-Long Island City - Astoria                          0.264864865
## Port Richmond-Long Island City - Astoria                                -1.193534711
## Ridgewood - Forest Hills-Long Island City - Astoria                     -0.627027027
## Rockaways-Long Island City - Astoria                                    -1.641441441
## South Beach - Tottenville-Long Island City - Astoria                    -2.472828829
## Southeast Queens-Long Island City - Astoria                             -1.181981982
## Southwest Queens-Long Island City - Astoria                             -0.984684685
## Stapleton - St. George-Long Island City - Astoria                       -1.430299417
## Sunset Park-Long Island City - Astoria                                   0.098198198
## Union Square - Lower East Side-Long Island City - Astoria               -0.272946476
## Upper East Side-Long Island City - Astoria                              -0.439122946
## Upper West Side-Long Island City - Astoria                               0.006306306
## Washington Heights-Long Island City - Astoria                            0.247747748
## West Queens-Long Island City - Astoria                                   0.161261261
## Williamsburg - Bushwick-Long Island City - Astoria                      -0.132432432
## Willowbrook-Long Island City - Astoria                                  -1.536181770
## Northeast Bronx-Lower Manhattan                                          0.591958135
## Pelham - Throgs Neck-Lower Manhattan                                     0.633399576
## Port Richmond-Lower Manhattan                                           -0.825000000
## Ridgewood - Forest Hills-Lower Manhattan                                -0.258492316
## Rockaways-Lower Manhattan                                               -1.272906730
## South Beach - Tottenville-Lower Manhattan                               -2.104294118
## Southeast Queens-Lower Manhattan                                        -0.813447271
## Southwest Queens-Lower Manhattan                                        -0.616149974
## Stapleton - St. George-Lower Manhattan                                  -1.061764706
## Sunset Park-Lower Manhattan                                              0.466732909
## Union Square - Lower East Side-Lower Manhattan                           0.095588235
## Upper East Side-Lower Manhattan                                         -0.070588235
## Upper West Side-Lower Manhattan                                          0.374841017
## Washington Heights-Lower Manhattan                                       0.616282459
## West Queens-Lower Manhattan                                              0.529795972
## Williamsburg - Bushwick-Lower Manhattan                                  0.236102279
## Willowbrook-Lower Manhattan                                             -1.167647059
## Pelham - Throgs Neck-Northeast Bronx                                     0.041441441
## Port Richmond-Northeast Bronx                                           -1.416958135
## Ridgewood - Forest Hills-Northeast Bronx                                -0.850450450
## Rockaways-Northeast Bronx                                               -1.864864865
## South Beach - Tottenville-Northeast Bronx                               -2.696252252
## Southeast Queens-Northeast Bronx                                        -1.405405405
## Southwest Queens-Northeast Bronx                                        -1.208108108
## Stapleton - St. George-Northeast Bronx                                  -1.653722840
## Sunset Park-Northeast Bronx                                             -0.125225225
## Union Square - Lower East Side-Northeast Bronx                          -0.496369899
## Upper East Side-Northeast Bronx                                         -0.662546370
## Upper West Side-Northeast Bronx                                         -0.217117117
## Washington Heights-Northeast Bronx                                       0.024324324
## West Queens-Northeast Bronx                                             -0.062162162
## Williamsburg - Bushwick-Northeast Bronx                                 -0.355855856
## Willowbrook-Northeast Bronx                                             -1.759605193
## Port Richmond-Pelham - Throgs Neck                                      -1.458399576
## Ridgewood - Forest Hills-Pelham - Throgs Neck                           -0.891891892
## Rockaways-Pelham - Throgs Neck                                          -1.906306306
## South Beach - Tottenville-Pelham - Throgs Neck                          -2.737693694
## Southeast Queens-Pelham - Throgs Neck                                   -1.446846847
## Southwest Queens-Pelham - Throgs Neck                                   -1.249549550
## Stapleton - St. George-Pelham - Throgs Neck                             -1.695164282
## Sunset Park-Pelham - Throgs Neck                                        -0.166666667
## Union Square - Lower East Side-Pelham - Throgs Neck                     -0.537811341
## Upper East Side-Pelham - Throgs Neck                                    -0.703987811
## Upper West Side-Pelham - Throgs Neck                                    -0.258558559
## Washington Heights-Pelham - Throgs Neck                                 -0.017117117
## West Queens-Pelham - Throgs Neck                                        -0.103603604
## Williamsburg - Bushwick-Pelham - Throgs Neck                            -0.397297297
## Willowbrook-Pelham - Throgs Neck                                        -1.801046635
## Ridgewood - Forest Hills-Port Richmond                                   0.566507684
## Rockaways-Port Richmond                                                 -0.447906730
## South Beach - Tottenville-Port Richmond                                 -1.279294118
## Southeast Queens-Port Richmond                                           0.011552729
## Southwest Queens-Port Richmond                                           0.208850026
## Stapleton - St. George-Port Richmond                                    -0.236764706
## Sunset Park-Port Richmond                                                1.291732909
## Union Square - Lower East Side-Port Richmond                             0.920588235
## Upper East Side-Port Richmond                                            0.754411765
## Upper West Side-Port Richmond                                            1.199841017
## Washington Heights-Port Richmond                                         1.441282459
## West Queens-Port Richmond                                                1.354795972
## Williamsburg - Bushwick-Port Richmond                                    1.061102279
## Willowbrook-Port Richmond                                               -0.342647059
## Rockaways-Ridgewood - Forest Hills                                      -1.014414414
## South Beach - Tottenville-Ridgewood - Forest Hills                      -1.845801802
## Southeast Queens-Ridgewood - Forest Hills                               -0.554954955
## Southwest Queens-Ridgewood - Forest Hills                               -0.357657658
## Stapleton - St. George-Ridgewood - Forest Hills                         -0.803272390
## Sunset Park-Ridgewood - Forest Hills                                     0.725225225
## Union Square - Lower East Side-Ridgewood - Forest Hills                  0.354080551
## Upper East Side-Ridgewood - Forest Hills                                 0.187904081
## Upper West Side-Ridgewood - Forest Hills                                 0.633333333
## Washington Heights-Ridgewood - Forest Hills                              0.874774775
## West Queens-Ridgewood - Forest Hills                                     0.788288288
## Williamsburg - Bushwick-Ridgewood - Forest Hills                         0.494594595
## Willowbrook-Ridgewood - Forest Hills                                    -0.909154743
## South Beach - Tottenville-Rockaways                                     -0.831387387
## Southeast Queens-Rockaways                                               0.459459459
## Southwest Queens-Rockaways                                               0.656756757
## Stapleton - St. George-Rockaways                                         0.211142024
## Sunset Park-Rockaways                                                    1.739639640
## Union Square - Lower East Side-Rockaways                                 1.368494966
## Upper East Side-Rockaways                                                1.202318495
## Upper West Side-Rockaways                                                1.647747748
## Washington Heights-Rockaways                                             1.889189189
## West Queens-Rockaways                                                    1.802702703
## Williamsburg - Bushwick-Rockaways                                        1.509009009
## Willowbrook-Rockaways                                                    0.105259671
## Southeast Queens-South Beach - Tottenville                               1.290846847
## Southwest Queens-South Beach - Tottenville                               1.488144144
## Stapleton - St. George-South Beach - Tottenville                         1.042529412
## Sunset Park-South Beach - Tottenville                                    2.571027027
## Union Square - Lower East Side-South Beach - Tottenville                 2.199882353
## Upper East Side-South Beach - Tottenville                                2.033705882
## Upper West Side-South Beach - Tottenville                                2.479135135
## Washington Heights-South Beach - Tottenville                             2.720576577
## West Queens-South Beach - Tottenville                                    2.634090090
## Williamsburg - Bushwick-South Beach - Tottenville                        2.340396396
## Willowbrook-South Beach - Tottenville                                    0.936647059
## Southwest Queens-Southeast Queens                                        0.197297297
## Stapleton - St. George-Southeast Queens                                 -0.248317435
## Sunset Park-Southeast Queens                                             1.280180180
## Union Square - Lower East Side-Southeast Queens                          0.909035506
## Upper East Side-Southeast Queens                                         0.742859036
## Upper West Side-Southeast Queens                                         1.188288288
## Washington Heights-Southeast Queens                                      1.429729730
## West Queens-Southeast Queens                                             1.343243243
## Williamsburg - Bushwick-Southeast Queens                                 1.049549550
## Willowbrook-Southeast Queens                                            -0.354199788
## Stapleton - St. George-Southwest Queens                                 -0.445614732
## Sunset Park-Southwest Queens                                             1.082882883
## Union Square - Lower East Side-Southwest Queens                          0.711738209
## Upper East Side-Southwest Queens                                         0.545561738
## Upper West Side-Southwest Queens                                         0.990990991
## Washington Heights-Southwest Queens                                      1.232432432
## West Queens-Southwest Queens                                             1.145945946
## Williamsburg - Bushwick-Southwest Queens                                 0.852252252
## Willowbrook-Southwest Queens                                            -0.551497085
## Sunset Park-Stapleton - St. George                                       1.528497615
## Union Square - Lower East Side-Stapleton - St. George                    1.157352941
## Upper East Side-Stapleton - St. George                                   0.991176471
## Upper West Side-Stapleton - St. George                                   1.436605723
## Washington Heights-Stapleton - St. George                                1.678047165
## West Queens-Stapleton - St. George                                       1.591560678
## Williamsburg - Bushwick-Stapleton - St. George                           1.297866985
## Willowbrook-Stapleton - St. George                                      -0.105882353
## Union Square - Lower East Side-Sunset Park                              -0.371144674
## Upper East Side-Sunset Park                                             -0.537321145
## Upper West Side-Sunset Park                                             -0.091891892
## Washington Heights-Sunset Park                                           0.149549550
## West Queens-Sunset Park                                                  0.063063063
## Williamsburg - Bushwick-Sunset Park                                     -0.230630631
## Willowbrook-Sunset Park                                                 -1.634379968
## Upper East Side-Union Square - Lower East Side                          -0.166176471
## Upper West Side-Union Square - Lower East Side                           0.279252782
## Washington Heights-Union Square - Lower East Side                        0.520694224
## West Queens-Union Square - Lower East Side                               0.434207737
## Williamsburg - Bushwick-Union Square - Lower East Side                   0.140514043
## Willowbrook-Union Square - Lower East Side                              -1.263235294
## Upper West Side-Upper East Side                                          0.445429253
## Washington Heights-Upper East Side                                       0.686870694
## West Queens-Upper East Side                                              0.600384208
## Williamsburg - Bushwick-Upper East Side                                  0.306690514
## Willowbrook-Upper East Side                                             -1.097058824
## Washington Heights-Upper West Side                                       0.241441441
## West Queens-Upper West Side                                              0.154954955
## Williamsburg - Bushwick-Upper West Side                                 -0.138738739
## Willowbrook-Upper West Side                                             -1.542488076
## West Queens-Washington Heights                                          -0.086486486
## Williamsburg - Bushwick-Washington Heights                              -0.380180180
## Willowbrook-Washington Heights                                          -1.783929518
## Williamsburg - Bushwick-West Queens                                     -0.293693694
## Willowbrook-West Queens                                                 -1.697443031
## Willowbrook-Williamsburg - Bushwick                                     -1.403749338
##                                                                         lwr upr
## Bedford Stuyvesant - Crown Heights-Bayside - Little Neck                NaN NaN
## Bensonhurst - Bay Ridge-Bayside - Little Neck                           NaN NaN
## Borough Park-Bayside - Little Neck                                      NaN NaN
## Canarsie - Flatlands-Bayside - Little Neck                              NaN NaN
## Central Harlem - Morningside Heights-Bayside - Little Neck              NaN NaN
## Chelsea - Clinton-Bayside - Little Neck                                 NaN NaN
## Coney Island - Sheepshead Bay-Bayside - Little Neck                     NaN NaN
## Crotona -Tremont-Bayside - Little Neck                                  NaN NaN
## Downtown - Heights - Slope-Bayside - Little Neck                        NaN NaN
## East Flatbush - Flatbush-Bayside - Little Neck                          NaN NaN
## East Harlem-Bayside - Little Neck                                       NaN NaN
## East New York-Bayside - Little Neck                                     NaN NaN
## Flushing - Clearview-Bayside - Little Neck                              NaN NaN
## Fordham - Bronx Pk-Bayside - Little Neck                                NaN NaN
## Fresh Meadows-Bayside - Little Neck                                     NaN NaN
## Gramercy Park - Murray Hill-Bayside - Little Neck                       NaN NaN
## Greenpoint-Bayside - Little Neck                                        NaN NaN
## Greenwich Village - SoHo-Bayside - Little Neck                          NaN NaN
## High Bridge - Morrisania-Bayside - Little Neck                          NaN NaN
## Hunts Point - Mott Haven-Bayside - Little Neck                          NaN NaN
## Jamaica-Bayside - Little Neck                                           NaN NaN
## Kingsbridge - Riverdale-Bayside - Little Neck                           NaN NaN
## Long Island City - Astoria-Bayside - Little Neck                        NaN NaN
## Lower Manhattan-Bayside - Little Neck                                   NaN NaN
## Northeast Bronx-Bayside - Little Neck                                   NaN NaN
## Pelham - Throgs Neck-Bayside - Little Neck                              NaN NaN
## Port Richmond-Bayside - Little Neck                                     NaN NaN
## Ridgewood - Forest Hills-Bayside - Little Neck                          NaN NaN
## Rockaways-Bayside - Little Neck                                         NaN NaN
## South Beach - Tottenville-Bayside - Little Neck                         NaN NaN
## Southeast Queens-Bayside - Little Neck                                  NaN NaN
## Southwest Queens-Bayside - Little Neck                                  NaN NaN
## Stapleton - St. George-Bayside - Little Neck                            NaN NaN
## Sunset Park-Bayside - Little Neck                                       NaN NaN
## Union Square - Lower East Side-Bayside - Little Neck                    NaN NaN
## Upper East Side-Bayside - Little Neck                                   NaN NaN
## Upper West Side-Bayside - Little Neck                                   NaN NaN
## Washington Heights-Bayside - Little Neck                                NaN NaN
## West Queens-Bayside - Little Neck                                       NaN NaN
## Williamsburg - Bushwick-Bayside - Little Neck                           NaN NaN
## Willowbrook-Bayside - Little Neck                                       NaN NaN
## Bensonhurst - Bay Ridge-Bedford Stuyvesant - Crown Heights              NaN NaN
## Borough Park-Bedford Stuyvesant - Crown Heights                         NaN NaN
## Canarsie - Flatlands-Bedford Stuyvesant - Crown Heights                 NaN NaN
## Central Harlem - Morningside Heights-Bedford Stuyvesant - Crown Heights NaN NaN
## Chelsea - Clinton-Bedford Stuyvesant - Crown Heights                    NaN NaN
## Coney Island - Sheepshead Bay-Bedford Stuyvesant - Crown Heights        NaN NaN
## Crotona -Tremont-Bedford Stuyvesant - Crown Heights                     NaN NaN
## Downtown - Heights - Slope-Bedford Stuyvesant - Crown Heights           NaN NaN
## East Flatbush - Flatbush-Bedford Stuyvesant - Crown Heights             NaN NaN
## East Harlem-Bedford Stuyvesant - Crown Heights                          NaN NaN
## East New York-Bedford Stuyvesant - Crown Heights                        NaN NaN
## Flushing - Clearview-Bedford Stuyvesant - Crown Heights                 NaN NaN
## Fordham - Bronx Pk-Bedford Stuyvesant - Crown Heights                   NaN NaN
## Fresh Meadows-Bedford Stuyvesant - Crown Heights                        NaN NaN
## Gramercy Park - Murray Hill-Bedford Stuyvesant - Crown Heights          NaN NaN
## Greenpoint-Bedford Stuyvesant - Crown Heights                           NaN NaN
## Greenwich Village - SoHo-Bedford Stuyvesant - Crown Heights             NaN NaN
## High Bridge - Morrisania-Bedford Stuyvesant - Crown Heights             NaN NaN
## Hunts Point - Mott Haven-Bedford Stuyvesant - Crown Heights             NaN NaN
## Jamaica-Bedford Stuyvesant - Crown Heights                              NaN NaN
## Kingsbridge - Riverdale-Bedford Stuyvesant - Crown Heights              NaN NaN
## Long Island City - Astoria-Bedford Stuyvesant - Crown Heights           NaN NaN
## Lower Manhattan-Bedford Stuyvesant - Crown Heights                      NaN NaN
## Northeast Bronx-Bedford Stuyvesant - Crown Heights                      NaN NaN
## Pelham - Throgs Neck-Bedford Stuyvesant - Crown Heights                 NaN NaN
## Port Richmond-Bedford Stuyvesant - Crown Heights                        NaN NaN
## Ridgewood - Forest Hills-Bedford Stuyvesant - Crown Heights             NaN NaN
## Rockaways-Bedford Stuyvesant - Crown Heights                            NaN NaN
## South Beach - Tottenville-Bedford Stuyvesant - Crown Heights            NaN NaN
## Southeast Queens-Bedford Stuyvesant - Crown Heights                     NaN NaN
## Southwest Queens-Bedford Stuyvesant - Crown Heights                     NaN NaN
## Stapleton - St. George-Bedford Stuyvesant - Crown Heights               NaN NaN
## Sunset Park-Bedford Stuyvesant - Crown Heights                          NaN NaN
## Union Square - Lower East Side-Bedford Stuyvesant - Crown Heights       NaN NaN
## Upper East Side-Bedford Stuyvesant - Crown Heights                      NaN NaN
## Upper West Side-Bedford Stuyvesant - Crown Heights                      NaN NaN
## Washington Heights-Bedford Stuyvesant - Crown Heights                   NaN NaN
## West Queens-Bedford Stuyvesant - Crown Heights                          NaN NaN
## Williamsburg - Bushwick-Bedford Stuyvesant - Crown Heights              NaN NaN
## Willowbrook-Bedford Stuyvesant - Crown Heights                          NaN NaN
## Borough Park-Bensonhurst - Bay Ridge                                    NaN NaN
## Canarsie - Flatlands-Bensonhurst - Bay Ridge                            NaN NaN
## Central Harlem - Morningside Heights-Bensonhurst - Bay Ridge            NaN NaN
## Chelsea - Clinton-Bensonhurst - Bay Ridge                               NaN NaN
## Coney Island - Sheepshead Bay-Bensonhurst - Bay Ridge                   NaN NaN
## Crotona -Tremont-Bensonhurst - Bay Ridge                                NaN NaN
## Downtown - Heights - Slope-Bensonhurst - Bay Ridge                      NaN NaN
## East Flatbush - Flatbush-Bensonhurst - Bay Ridge                        NaN NaN
## East Harlem-Bensonhurst - Bay Ridge                                     NaN NaN
## East New York-Bensonhurst - Bay Ridge                                   NaN NaN
## Flushing - Clearview-Bensonhurst - Bay Ridge                            NaN NaN
## Fordham - Bronx Pk-Bensonhurst - Bay Ridge                              NaN NaN
## Fresh Meadows-Bensonhurst - Bay Ridge                                   NaN NaN
## Gramercy Park - Murray Hill-Bensonhurst - Bay Ridge                     NaN NaN
## Greenpoint-Bensonhurst - Bay Ridge                                      NaN NaN
## Greenwich Village - SoHo-Bensonhurst - Bay Ridge                        NaN NaN
## High Bridge - Morrisania-Bensonhurst - Bay Ridge                        NaN NaN
## Hunts Point - Mott Haven-Bensonhurst - Bay Ridge                        NaN NaN
## Jamaica-Bensonhurst - Bay Ridge                                         NaN NaN
## Kingsbridge - Riverdale-Bensonhurst - Bay Ridge                         NaN NaN
## Long Island City - Astoria-Bensonhurst - Bay Ridge                      NaN NaN
## Lower Manhattan-Bensonhurst - Bay Ridge                                 NaN NaN
## Northeast Bronx-Bensonhurst - Bay Ridge                                 NaN NaN
## Pelham - Throgs Neck-Bensonhurst - Bay Ridge                            NaN NaN
## Port Richmond-Bensonhurst - Bay Ridge                                   NaN NaN
## Ridgewood - Forest Hills-Bensonhurst - Bay Ridge                        NaN NaN
## Rockaways-Bensonhurst - Bay Ridge                                       NaN NaN
## South Beach - Tottenville-Bensonhurst - Bay Ridge                       NaN NaN
## Southeast Queens-Bensonhurst - Bay Ridge                                NaN NaN
## Southwest Queens-Bensonhurst - Bay Ridge                                NaN NaN
## Stapleton - St. George-Bensonhurst - Bay Ridge                          NaN NaN
## Sunset Park-Bensonhurst - Bay Ridge                                     NaN NaN
## Union Square - Lower East Side-Bensonhurst - Bay Ridge                  NaN NaN
## Upper East Side-Bensonhurst - Bay Ridge                                 NaN NaN
## Upper West Side-Bensonhurst - Bay Ridge                                 NaN NaN
## Washington Heights-Bensonhurst - Bay Ridge                              NaN NaN
## West Queens-Bensonhurst - Bay Ridge                                     NaN NaN
## Williamsburg - Bushwick-Bensonhurst - Bay Ridge                         NaN NaN
## Willowbrook-Bensonhurst - Bay Ridge                                     NaN NaN
## Canarsie - Flatlands-Borough Park                                       NaN NaN
## Central Harlem - Morningside Heights-Borough Park                       NaN NaN
## Chelsea - Clinton-Borough Park                                          NaN NaN
## Coney Island - Sheepshead Bay-Borough Park                              NaN NaN
## Crotona -Tremont-Borough Park                                           NaN NaN
## Downtown - Heights - Slope-Borough Park                                 NaN NaN
## East Flatbush - Flatbush-Borough Park                                   NaN NaN
## East Harlem-Borough Park                                                NaN NaN
## East New York-Borough Park                                              NaN NaN
## Flushing - Clearview-Borough Park                                       NaN NaN
## Fordham - Bronx Pk-Borough Park                                         NaN NaN
## Fresh Meadows-Borough Park                                              NaN NaN
## Gramercy Park - Murray Hill-Borough Park                                NaN NaN
## Greenpoint-Borough Park                                                 NaN NaN
## Greenwich Village - SoHo-Borough Park                                   NaN NaN
## High Bridge - Morrisania-Borough Park                                   NaN NaN
## Hunts Point - Mott Haven-Borough Park                                   NaN NaN
## Jamaica-Borough Park                                                    NaN NaN
## Kingsbridge - Riverdale-Borough Park                                    NaN NaN
## Long Island City - Astoria-Borough Park                                 NaN NaN
## Lower Manhattan-Borough Park                                            NaN NaN
## Northeast Bronx-Borough Park                                            NaN NaN
## Pelham - Throgs Neck-Borough Park                                       NaN NaN
## Port Richmond-Borough Park                                              NaN NaN
## Ridgewood - Forest Hills-Borough Park                                   NaN NaN
## Rockaways-Borough Park                                                  NaN NaN
## South Beach - Tottenville-Borough Park                                  NaN NaN
## Southeast Queens-Borough Park                                           NaN NaN
## Southwest Queens-Borough Park                                           NaN NaN
## Stapleton - St. George-Borough Park                                     NaN NaN
## Sunset Park-Borough Park                                                NaN NaN
## Union Square - Lower East Side-Borough Park                             NaN NaN
## Upper East Side-Borough Park                                            NaN NaN
## Upper West Side-Borough Park                                            NaN NaN
## Washington Heights-Borough Park                                         NaN NaN
## West Queens-Borough Park                                                NaN NaN
## Williamsburg - Bushwick-Borough Park                                    NaN NaN
## Willowbrook-Borough Park                                                NaN NaN
## Central Harlem - Morningside Heights-Canarsie - Flatlands               NaN NaN
## Chelsea - Clinton-Canarsie - Flatlands                                  NaN NaN
## Coney Island - Sheepshead Bay-Canarsie - Flatlands                      NaN NaN
## Crotona -Tremont-Canarsie - Flatlands                                   NaN NaN
## Downtown - Heights - Slope-Canarsie - Flatlands                         NaN NaN
## East Flatbush - Flatbush-Canarsie - Flatlands                           NaN NaN
## East Harlem-Canarsie - Flatlands                                        NaN NaN
## East New York-Canarsie - Flatlands                                      NaN NaN
## Flushing - Clearview-Canarsie - Flatlands                               NaN NaN
## Fordham - Bronx Pk-Canarsie - Flatlands                                 NaN NaN
## Fresh Meadows-Canarsie - Flatlands                                      NaN NaN
## Gramercy Park - Murray Hill-Canarsie - Flatlands                        NaN NaN
## Greenpoint-Canarsie - Flatlands                                         NaN NaN
## Greenwich Village - SoHo-Canarsie - Flatlands                           NaN NaN
## High Bridge - Morrisania-Canarsie - Flatlands                           NaN NaN
## Hunts Point - Mott Haven-Canarsie - Flatlands                           NaN NaN
## Jamaica-Canarsie - Flatlands                                            NaN NaN
## Kingsbridge - Riverdale-Canarsie - Flatlands                            NaN NaN
## Long Island City - Astoria-Canarsie - Flatlands                         NaN NaN
## Lower Manhattan-Canarsie - Flatlands                                    NaN NaN
## Northeast Bronx-Canarsie - Flatlands                                    NaN NaN
## Pelham - Throgs Neck-Canarsie - Flatlands                               NaN NaN
## Port Richmond-Canarsie - Flatlands                                      NaN NaN
## Ridgewood - Forest Hills-Canarsie - Flatlands                           NaN NaN
## Rockaways-Canarsie - Flatlands                                          NaN NaN
## South Beach - Tottenville-Canarsie - Flatlands                          NaN NaN
## Southeast Queens-Canarsie - Flatlands                                   NaN NaN
## Southwest Queens-Canarsie - Flatlands                                   NaN NaN
## Stapleton - St. George-Canarsie - Flatlands                             NaN NaN
## Sunset Park-Canarsie - Flatlands                                        NaN NaN
## Union Square - Lower East Side-Canarsie - Flatlands                     NaN NaN
## Upper East Side-Canarsie - Flatlands                                    NaN NaN
## Upper West Side-Canarsie - Flatlands                                    NaN NaN
## Washington Heights-Canarsie - Flatlands                                 NaN NaN
## West Queens-Canarsie - Flatlands                                        NaN NaN
## Williamsburg - Bushwick-Canarsie - Flatlands                            NaN NaN
## Willowbrook-Canarsie - Flatlands                                        NaN NaN
## Chelsea - Clinton-Central Harlem - Morningside Heights                  NaN NaN
## Coney Island - Sheepshead Bay-Central Harlem - Morningside Heights      NaN NaN
## Crotona -Tremont-Central Harlem - Morningside Heights                   NaN NaN
## Downtown - Heights - Slope-Central Harlem - Morningside Heights         NaN NaN
## East Flatbush - Flatbush-Central Harlem - Morningside Heights           NaN NaN
## East Harlem-Central Harlem - Morningside Heights                        NaN NaN
## East New York-Central Harlem - Morningside Heights                      NaN NaN
## Flushing - Clearview-Central Harlem - Morningside Heights               NaN NaN
## Fordham - Bronx Pk-Central Harlem - Morningside Heights                 NaN NaN
## Fresh Meadows-Central Harlem - Morningside Heights                      NaN NaN
## Gramercy Park - Murray Hill-Central Harlem - Morningside Heights        NaN NaN
## Greenpoint-Central Harlem - Morningside Heights                         NaN NaN
## Greenwich Village - SoHo-Central Harlem - Morningside Heights           NaN NaN
## High Bridge - Morrisania-Central Harlem - Morningside Heights           NaN NaN
## Hunts Point - Mott Haven-Central Harlem - Morningside Heights           NaN NaN
## Jamaica-Central Harlem - Morningside Heights                            NaN NaN
## Kingsbridge - Riverdale-Central Harlem - Morningside Heights            NaN NaN
## Long Island City - Astoria-Central Harlem - Morningside Heights         NaN NaN
## Lower Manhattan-Central Harlem - Morningside Heights                    NaN NaN
## Northeast Bronx-Central Harlem - Morningside Heights                    NaN NaN
## Pelham - Throgs Neck-Central Harlem - Morningside Heights               NaN NaN
## Port Richmond-Central Harlem - Morningside Heights                      NaN NaN
## Ridgewood - Forest Hills-Central Harlem - Morningside Heights           NaN NaN
## Rockaways-Central Harlem - Morningside Heights                          NaN NaN
## South Beach - Tottenville-Central Harlem - Morningside Heights          NaN NaN
## Southeast Queens-Central Harlem - Morningside Heights                   NaN NaN
## Southwest Queens-Central Harlem - Morningside Heights                   NaN NaN
## Stapleton - St. George-Central Harlem - Morningside Heights             NaN NaN
## Sunset Park-Central Harlem - Morningside Heights                        NaN NaN
## Union Square - Lower East Side-Central Harlem - Morningside Heights     NaN NaN
## Upper East Side-Central Harlem - Morningside Heights                    NaN NaN
## Upper West Side-Central Harlem - Morningside Heights                    NaN NaN
## Washington Heights-Central Harlem - Morningside Heights                 NaN NaN
## West Queens-Central Harlem - Morningside Heights                        NaN NaN
## Williamsburg - Bushwick-Central Harlem - Morningside Heights            NaN NaN
## Willowbrook-Central Harlem - Morningside Heights                        NaN NaN
## Coney Island - Sheepshead Bay-Chelsea - Clinton                         NaN NaN
## Crotona -Tremont-Chelsea - Clinton                                      NaN NaN
## Downtown - Heights - Slope-Chelsea - Clinton                            NaN NaN
## East Flatbush - Flatbush-Chelsea - Clinton                              NaN NaN
## East Harlem-Chelsea - Clinton                                           NaN NaN
## East New York-Chelsea - Clinton                                         NaN NaN
## Flushing - Clearview-Chelsea - Clinton                                  NaN NaN
## Fordham - Bronx Pk-Chelsea - Clinton                                    NaN NaN
## Fresh Meadows-Chelsea - Clinton                                         NaN NaN
## Gramercy Park - Murray Hill-Chelsea - Clinton                           NaN NaN
## Greenpoint-Chelsea - Clinton                                            NaN NaN
## Greenwich Village - SoHo-Chelsea - Clinton                              NaN NaN
## High Bridge - Morrisania-Chelsea - Clinton                              NaN NaN
## Hunts Point - Mott Haven-Chelsea - Clinton                              NaN NaN
## Jamaica-Chelsea - Clinton                                               NaN NaN
## Kingsbridge - Riverdale-Chelsea - Clinton                               NaN NaN
## Long Island City - Astoria-Chelsea - Clinton                            NaN NaN
## Lower Manhattan-Chelsea - Clinton                                       NaN NaN
## Northeast Bronx-Chelsea - Clinton                                       NaN NaN
## Pelham - Throgs Neck-Chelsea - Clinton                                  NaN NaN
## Port Richmond-Chelsea - Clinton                                         NaN NaN
## Ridgewood - Forest Hills-Chelsea - Clinton                              NaN NaN
## Rockaways-Chelsea - Clinton                                             NaN NaN
## South Beach - Tottenville-Chelsea - Clinton                             NaN NaN
## Southeast Queens-Chelsea - Clinton                                      NaN NaN
## Southwest Queens-Chelsea - Clinton                                      NaN NaN
## Stapleton - St. George-Chelsea - Clinton                                NaN NaN
## Sunset Park-Chelsea - Clinton                                           NaN NaN
## Union Square - Lower East Side-Chelsea - Clinton                        NaN NaN
## Upper East Side-Chelsea - Clinton                                       NaN NaN
## Upper West Side-Chelsea - Clinton                                       NaN NaN
## Washington Heights-Chelsea - Clinton                                    NaN NaN
## West Queens-Chelsea - Clinton                                           NaN NaN
## Williamsburg - Bushwick-Chelsea - Clinton                               NaN NaN
## Willowbrook-Chelsea - Clinton                                           NaN NaN
## Crotona -Tremont-Coney Island - Sheepshead Bay                          NaN NaN
## Downtown - Heights - Slope-Coney Island - Sheepshead Bay                NaN NaN
## East Flatbush - Flatbush-Coney Island - Sheepshead Bay                  NaN NaN
## East Harlem-Coney Island - Sheepshead Bay                               NaN NaN
## East New York-Coney Island - Sheepshead Bay                             NaN NaN
## Flushing - Clearview-Coney Island - Sheepshead Bay                      NaN NaN
## Fordham - Bronx Pk-Coney Island - Sheepshead Bay                        NaN NaN
## Fresh Meadows-Coney Island - Sheepshead Bay                             NaN NaN
## Gramercy Park - Murray Hill-Coney Island - Sheepshead Bay               NaN NaN
## Greenpoint-Coney Island - Sheepshead Bay                                NaN NaN
## Greenwich Village - SoHo-Coney Island - Sheepshead Bay                  NaN NaN
## High Bridge - Morrisania-Coney Island - Sheepshead Bay                  NaN NaN
## Hunts Point - Mott Haven-Coney Island - Sheepshead Bay                  NaN NaN
## Jamaica-Coney Island - Sheepshead Bay                                   NaN NaN
## Kingsbridge - Riverdale-Coney Island - Sheepshead Bay                   NaN NaN
## Long Island City - Astoria-Coney Island - Sheepshead Bay                NaN NaN
## Lower Manhattan-Coney Island - Sheepshead Bay                           NaN NaN
## Northeast Bronx-Coney Island - Sheepshead Bay                           NaN NaN
## Pelham - Throgs Neck-Coney Island - Sheepshead Bay                      NaN NaN
## Port Richmond-Coney Island - Sheepshead Bay                             NaN NaN
## Ridgewood - Forest Hills-Coney Island - Sheepshead Bay                  NaN NaN
## Rockaways-Coney Island - Sheepshead Bay                                 NaN NaN
## South Beach - Tottenville-Coney Island - Sheepshead Bay                 NaN NaN
## Southeast Queens-Coney Island - Sheepshead Bay                          NaN NaN
## Southwest Queens-Coney Island - Sheepshead Bay                          NaN NaN
## Stapleton - St. George-Coney Island - Sheepshead Bay                    NaN NaN
## Sunset Park-Coney Island - Sheepshead Bay                               NaN NaN
## Union Square - Lower East Side-Coney Island - Sheepshead Bay            NaN NaN
## Upper East Side-Coney Island - Sheepshead Bay                           NaN NaN
## Upper West Side-Coney Island - Sheepshead Bay                           NaN NaN
## Washington Heights-Coney Island - Sheepshead Bay                        NaN NaN
## West Queens-Coney Island - Sheepshead Bay                               NaN NaN
## Williamsburg - Bushwick-Coney Island - Sheepshead Bay                   NaN NaN
## Willowbrook-Coney Island - Sheepshead Bay                               NaN NaN
## Downtown - Heights - Slope-Crotona -Tremont                             NaN NaN
## East Flatbush - Flatbush-Crotona -Tremont                               NaN NaN
## East Harlem-Crotona -Tremont                                            NaN NaN
## East New York-Crotona -Tremont                                          NaN NaN
## Flushing - Clearview-Crotona -Tremont                                   NaN NaN
## Fordham - Bronx Pk-Crotona -Tremont                                     NaN NaN
## Fresh Meadows-Crotona -Tremont                                          NaN NaN
## Gramercy Park - Murray Hill-Crotona -Tremont                            NaN NaN
## Greenpoint-Crotona -Tremont                                             NaN NaN
## Greenwich Village - SoHo-Crotona -Tremont                               NaN NaN
## High Bridge - Morrisania-Crotona -Tremont                               NaN NaN
## Hunts Point - Mott Haven-Crotona -Tremont                               NaN NaN
## Jamaica-Crotona -Tremont                                                NaN NaN
## Kingsbridge - Riverdale-Crotona -Tremont                                NaN NaN
## Long Island City - Astoria-Crotona -Tremont                             NaN NaN
## Lower Manhattan-Crotona -Tremont                                        NaN NaN
## Northeast Bronx-Crotona -Tremont                                        NaN NaN
## Pelham - Throgs Neck-Crotona -Tremont                                   NaN NaN
## Port Richmond-Crotona -Tremont                                          NaN NaN
## Ridgewood - Forest Hills-Crotona -Tremont                               NaN NaN
## Rockaways-Crotona -Tremont                                              NaN NaN
## South Beach - Tottenville-Crotona -Tremont                              NaN NaN
## Southeast Queens-Crotona -Tremont                                       NaN NaN
## Southwest Queens-Crotona -Tremont                                       NaN NaN
## Stapleton - St. George-Crotona -Tremont                                 NaN NaN
## Sunset Park-Crotona -Tremont                                            NaN NaN
## Union Square - Lower East Side-Crotona -Tremont                         NaN NaN
## Upper East Side-Crotona -Tremont                                        NaN NaN
## Upper West Side-Crotona -Tremont                                        NaN NaN
## Washington Heights-Crotona -Tremont                                     NaN NaN
## West Queens-Crotona -Tremont                                            NaN NaN
## Williamsburg - Bushwick-Crotona -Tremont                                NaN NaN
## Willowbrook-Crotona -Tremont                                            NaN NaN
## East Flatbush - Flatbush-Downtown - Heights - Slope                     NaN NaN
## East Harlem-Downtown - Heights - Slope                                  NaN NaN
## East New York-Downtown - Heights - Slope                                NaN NaN
## Flushing - Clearview-Downtown - Heights - Slope                         NaN NaN
## Fordham - Bronx Pk-Downtown - Heights - Slope                           NaN NaN
## Fresh Meadows-Downtown - Heights - Slope                                NaN NaN
## Gramercy Park - Murray Hill-Downtown - Heights - Slope                  NaN NaN
## Greenpoint-Downtown - Heights - Slope                                   NaN NaN
## Greenwich Village - SoHo-Downtown - Heights - Slope                     NaN NaN
## High Bridge - Morrisania-Downtown - Heights - Slope                     NaN NaN
## Hunts Point - Mott Haven-Downtown - Heights - Slope                     NaN NaN
## Jamaica-Downtown - Heights - Slope                                      NaN NaN
## Kingsbridge - Riverdale-Downtown - Heights - Slope                      NaN NaN
## Long Island City - Astoria-Downtown - Heights - Slope                   NaN NaN
## Lower Manhattan-Downtown - Heights - Slope                              NaN NaN
## Northeast Bronx-Downtown - Heights - Slope                              NaN NaN
## Pelham - Throgs Neck-Downtown - Heights - Slope                         NaN NaN
## Port Richmond-Downtown - Heights - Slope                                NaN NaN
## Ridgewood - Forest Hills-Downtown - Heights - Slope                     NaN NaN
## Rockaways-Downtown - Heights - Slope                                    NaN NaN
## South Beach - Tottenville-Downtown - Heights - Slope                    NaN NaN
## Southeast Queens-Downtown - Heights - Slope                             NaN NaN
## Southwest Queens-Downtown - Heights - Slope                             NaN NaN
## Stapleton - St. George-Downtown - Heights - Slope                       NaN NaN
## Sunset Park-Downtown - Heights - Slope                                  NaN NaN
## Union Square - Lower East Side-Downtown - Heights - Slope               NaN NaN
## Upper East Side-Downtown - Heights - Slope                              NaN NaN
## Upper West Side-Downtown - Heights - Slope                              NaN NaN
## Washington Heights-Downtown - Heights - Slope                           NaN NaN
## West Queens-Downtown - Heights - Slope                                  NaN NaN
## Williamsburg - Bushwick-Downtown - Heights - Slope                      NaN NaN
## Willowbrook-Downtown - Heights - Slope                                  NaN NaN
## East Harlem-East Flatbush - Flatbush                                    NaN NaN
## East New York-East Flatbush - Flatbush                                  NaN NaN
## Flushing - Clearview-East Flatbush - Flatbush                           NaN NaN
## Fordham - Bronx Pk-East Flatbush - Flatbush                             NaN NaN
## Fresh Meadows-East Flatbush - Flatbush                                  NaN NaN
## Gramercy Park - Murray Hill-East Flatbush - Flatbush                    NaN NaN
## Greenpoint-East Flatbush - Flatbush                                     NaN NaN
## Greenwich Village - SoHo-East Flatbush - Flatbush                       NaN NaN
## High Bridge - Morrisania-East Flatbush - Flatbush                       NaN NaN
## Hunts Point - Mott Haven-East Flatbush - Flatbush                       NaN NaN
## Jamaica-East Flatbush - Flatbush                                        NaN NaN
## Kingsbridge - Riverdale-East Flatbush - Flatbush                        NaN NaN
## Long Island City - Astoria-East Flatbush - Flatbush                     NaN NaN
## Lower Manhattan-East Flatbush - Flatbush                                NaN NaN
## Northeast Bronx-East Flatbush - Flatbush                                NaN NaN
## Pelham - Throgs Neck-East Flatbush - Flatbush                           NaN NaN
## Port Richmond-East Flatbush - Flatbush                                  NaN NaN
## Ridgewood - Forest Hills-East Flatbush - Flatbush                       NaN NaN
## Rockaways-East Flatbush - Flatbush                                      NaN NaN
## South Beach - Tottenville-East Flatbush - Flatbush                      NaN NaN
## Southeast Queens-East Flatbush - Flatbush                               NaN NaN
## Southwest Queens-East Flatbush - Flatbush                               NaN NaN
## Stapleton - St. George-East Flatbush - Flatbush                         NaN NaN
## Sunset Park-East Flatbush - Flatbush                                    NaN NaN
## Union Square - Lower East Side-East Flatbush - Flatbush                 NaN NaN
## Upper East Side-East Flatbush - Flatbush                                NaN NaN
## Upper West Side-East Flatbush - Flatbush                                NaN NaN
## Washington Heights-East Flatbush - Flatbush                             NaN NaN
## West Queens-East Flatbush - Flatbush                                    NaN NaN
## Williamsburg - Bushwick-East Flatbush - Flatbush                        NaN NaN
## Willowbrook-East Flatbush - Flatbush                                    NaN NaN
## East New York-East Harlem                                               NaN NaN
## Flushing - Clearview-East Harlem                                        NaN NaN
## Fordham - Bronx Pk-East Harlem                                          NaN NaN
## Fresh Meadows-East Harlem                                               NaN NaN
## Gramercy Park - Murray Hill-East Harlem                                 NaN NaN
## Greenpoint-East Harlem                                                  NaN NaN
## Greenwich Village - SoHo-East Harlem                                    NaN NaN
## High Bridge - Morrisania-East Harlem                                    NaN NaN
## Hunts Point - Mott Haven-East Harlem                                    NaN NaN
## Jamaica-East Harlem                                                     NaN NaN
## Kingsbridge - Riverdale-East Harlem                                     NaN NaN
## Long Island City - Astoria-East Harlem                                  NaN NaN
## Lower Manhattan-East Harlem                                             NaN NaN
## Northeast Bronx-East Harlem                                             NaN NaN
## Pelham - Throgs Neck-East Harlem                                        NaN NaN
## Port Richmond-East Harlem                                               NaN NaN
## Ridgewood - Forest Hills-East Harlem                                    NaN NaN
## Rockaways-East Harlem                                                   NaN NaN
## South Beach - Tottenville-East Harlem                                   NaN NaN
## Southeast Queens-East Harlem                                            NaN NaN
## Southwest Queens-East Harlem                                            NaN NaN
## Stapleton - St. George-East Harlem                                      NaN NaN
## Sunset Park-East Harlem                                                 NaN NaN
## Union Square - Lower East Side-East Harlem                              NaN NaN
## Upper East Side-East Harlem                                             NaN NaN
## Upper West Side-East Harlem                                             NaN NaN
## Washington Heights-East Harlem                                          NaN NaN
## West Queens-East Harlem                                                 NaN NaN
## Williamsburg - Bushwick-East Harlem                                     NaN NaN
## Willowbrook-East Harlem                                                 NaN NaN
## Flushing - Clearview-East New York                                      NaN NaN
## Fordham - Bronx Pk-East New York                                        NaN NaN
## Fresh Meadows-East New York                                             NaN NaN
## Gramercy Park - Murray Hill-East New York                               NaN NaN
## Greenpoint-East New York                                                NaN NaN
## Greenwich Village - SoHo-East New York                                  NaN NaN
## High Bridge - Morrisania-East New York                                  NaN NaN
## Hunts Point - Mott Haven-East New York                                  NaN NaN
## Jamaica-East New York                                                   NaN NaN
## Kingsbridge - Riverdale-East New York                                   NaN NaN
## Long Island City - Astoria-East New York                                NaN NaN
## Lower Manhattan-East New York                                           NaN NaN
## Northeast Bronx-East New York                                           NaN NaN
## Pelham - Throgs Neck-East New York                                      NaN NaN
## Port Richmond-East New York                                             NaN NaN
## Ridgewood - Forest Hills-East New York                                  NaN NaN
## Rockaways-East New York                                                 NaN NaN
## South Beach - Tottenville-East New York                                 NaN NaN
## Southeast Queens-East New York                                          NaN NaN
## Southwest Queens-East New York                                          NaN NaN
## Stapleton - St. George-East New York                                    NaN NaN
## Sunset Park-East New York                                               NaN NaN
## Union Square - Lower East Side-East New York                            NaN NaN
## Upper East Side-East New York                                           NaN NaN
## Upper West Side-East New York                                           NaN NaN
## Washington Heights-East New York                                        NaN NaN
## West Queens-East New York                                               NaN NaN
## Williamsburg - Bushwick-East New York                                   NaN NaN
## Willowbrook-East New York                                               NaN NaN
## Fordham - Bronx Pk-Flushing - Clearview                                 NaN NaN
## Fresh Meadows-Flushing - Clearview                                      NaN NaN
## Gramercy Park - Murray Hill-Flushing - Clearview                        NaN NaN
## Greenpoint-Flushing - Clearview                                         NaN NaN
## Greenwich Village - SoHo-Flushing - Clearview                           NaN NaN
## High Bridge - Morrisania-Flushing - Clearview                           NaN NaN
## Hunts Point - Mott Haven-Flushing - Clearview                           NaN NaN
## Jamaica-Flushing - Clearview                                            NaN NaN
## Kingsbridge - Riverdale-Flushing - Clearview                            NaN NaN
## Long Island City - Astoria-Flushing - Clearview                         NaN NaN
## Lower Manhattan-Flushing - Clearview                                    NaN NaN
## Northeast Bronx-Flushing - Clearview                                    NaN NaN
## Pelham - Throgs Neck-Flushing - Clearview                               NaN NaN
## Port Richmond-Flushing - Clearview                                      NaN NaN
## Ridgewood - Forest Hills-Flushing - Clearview                           NaN NaN
## Rockaways-Flushing - Clearview                                          NaN NaN
## South Beach - Tottenville-Flushing - Clearview                          NaN NaN
## Southeast Queens-Flushing - Clearview                                   NaN NaN
## Southwest Queens-Flushing - Clearview                                   NaN NaN
## Stapleton - St. George-Flushing - Clearview                             NaN NaN
## Sunset Park-Flushing - Clearview                                        NaN NaN
## Union Square - Lower East Side-Flushing - Clearview                     NaN NaN
## Upper East Side-Flushing - Clearview                                    NaN NaN
## Upper West Side-Flushing - Clearview                                    NaN NaN
## Washington Heights-Flushing - Clearview                                 NaN NaN
## West Queens-Flushing - Clearview                                        NaN NaN
## Williamsburg - Bushwick-Flushing - Clearview                            NaN NaN
## Willowbrook-Flushing - Clearview                                        NaN NaN
## Fresh Meadows-Fordham - Bronx Pk                                        NaN NaN
## Gramercy Park - Murray Hill-Fordham - Bronx Pk                          NaN NaN
## Greenpoint-Fordham - Bronx Pk                                           NaN NaN
## Greenwich Village - SoHo-Fordham - Bronx Pk                             NaN NaN
## High Bridge - Morrisania-Fordham - Bronx Pk                             NaN NaN
## Hunts Point - Mott Haven-Fordham - Bronx Pk                             NaN NaN
## Jamaica-Fordham - Bronx Pk                                              NaN NaN
## Kingsbridge - Riverdale-Fordham - Bronx Pk                              NaN NaN
## Long Island City - Astoria-Fordham - Bronx Pk                           NaN NaN
## Lower Manhattan-Fordham - Bronx Pk                                      NaN NaN
## Northeast Bronx-Fordham - Bronx Pk                                      NaN NaN
## Pelham - Throgs Neck-Fordham - Bronx Pk                                 NaN NaN
## Port Richmond-Fordham - Bronx Pk                                        NaN NaN
## Ridgewood - Forest Hills-Fordham - Bronx Pk                             NaN NaN
## Rockaways-Fordham - Bronx Pk                                            NaN NaN
## South Beach - Tottenville-Fordham - Bronx Pk                            NaN NaN
## Southeast Queens-Fordham - Bronx Pk                                     NaN NaN
## Southwest Queens-Fordham - Bronx Pk                                     NaN NaN
## Stapleton - St. George-Fordham - Bronx Pk                               NaN NaN
## Sunset Park-Fordham - Bronx Pk                                          NaN NaN
## Union Square - Lower East Side-Fordham - Bronx Pk                       NaN NaN
## Upper East Side-Fordham - Bronx Pk                                      NaN NaN
## Upper West Side-Fordham - Bronx Pk                                      NaN NaN
## Washington Heights-Fordham - Bronx Pk                                   NaN NaN
## West Queens-Fordham - Bronx Pk                                          NaN NaN
## Williamsburg - Bushwick-Fordham - Bronx Pk                              NaN NaN
## Willowbrook-Fordham - Bronx Pk                                          NaN NaN
## Gramercy Park - Murray Hill-Fresh Meadows                               NaN NaN
## Greenpoint-Fresh Meadows                                                NaN NaN
## Greenwich Village - SoHo-Fresh Meadows                                  NaN NaN
## High Bridge - Morrisania-Fresh Meadows                                  NaN NaN
## Hunts Point - Mott Haven-Fresh Meadows                                  NaN NaN
## Jamaica-Fresh Meadows                                                   NaN NaN
## Kingsbridge - Riverdale-Fresh Meadows                                   NaN NaN
## Long Island City - Astoria-Fresh Meadows                                NaN NaN
## Lower Manhattan-Fresh Meadows                                           NaN NaN
## Northeast Bronx-Fresh Meadows                                           NaN NaN
## Pelham - Throgs Neck-Fresh Meadows                                      NaN NaN
## Port Richmond-Fresh Meadows                                             NaN NaN
## Ridgewood - Forest Hills-Fresh Meadows                                  NaN NaN
## Rockaways-Fresh Meadows                                                 NaN NaN
## South Beach - Tottenville-Fresh Meadows                                 NaN NaN
## Southeast Queens-Fresh Meadows                                          NaN NaN
## Southwest Queens-Fresh Meadows                                          NaN NaN
## Stapleton - St. George-Fresh Meadows                                    NaN NaN
## Sunset Park-Fresh Meadows                                               NaN NaN
## Union Square - Lower East Side-Fresh Meadows                            NaN NaN
## Upper East Side-Fresh Meadows                                           NaN NaN
## Upper West Side-Fresh Meadows                                           NaN NaN
## Washington Heights-Fresh Meadows                                        NaN NaN
## West Queens-Fresh Meadows                                               NaN NaN
## Williamsburg - Bushwick-Fresh Meadows                                   NaN NaN
## Willowbrook-Fresh Meadows                                               NaN NaN
## Greenpoint-Gramercy Park - Murray Hill                                  NaN NaN
## Greenwich Village - SoHo-Gramercy Park - Murray Hill                    NaN NaN
## High Bridge - Morrisania-Gramercy Park - Murray Hill                    NaN NaN
## Hunts Point - Mott Haven-Gramercy Park - Murray Hill                    NaN NaN
## Jamaica-Gramercy Park - Murray Hill                                     NaN NaN
## Kingsbridge - Riverdale-Gramercy Park - Murray Hill                     NaN NaN
## Long Island City - Astoria-Gramercy Park - Murray Hill                  NaN NaN
## Lower Manhattan-Gramercy Park - Murray Hill                             NaN NaN
## Northeast Bronx-Gramercy Park - Murray Hill                             NaN NaN
## Pelham - Throgs Neck-Gramercy Park - Murray Hill                        NaN NaN
## Port Richmond-Gramercy Park - Murray Hill                               NaN NaN
## Ridgewood - Forest Hills-Gramercy Park - Murray Hill                    NaN NaN
## Rockaways-Gramercy Park - Murray Hill                                   NaN NaN
## South Beach - Tottenville-Gramercy Park - Murray Hill                   NaN NaN
## Southeast Queens-Gramercy Park - Murray Hill                            NaN NaN
## Southwest Queens-Gramercy Park - Murray Hill                            NaN NaN
## Stapleton - St. George-Gramercy Park - Murray Hill                      NaN NaN
## Sunset Park-Gramercy Park - Murray Hill                                 NaN NaN
## Union Square - Lower East Side-Gramercy Park - Murray Hill              NaN NaN
## Upper East Side-Gramercy Park - Murray Hill                             NaN NaN
## Upper West Side-Gramercy Park - Murray Hill                             NaN NaN
## Washington Heights-Gramercy Park - Murray Hill                          NaN NaN
## West Queens-Gramercy Park - Murray Hill                                 NaN NaN
## Williamsburg - Bushwick-Gramercy Park - Murray Hill                     NaN NaN
## Willowbrook-Gramercy Park - Murray Hill                                 NaN NaN
## Greenwich Village - SoHo-Greenpoint                                     NaN NaN
## High Bridge - Morrisania-Greenpoint                                     NaN NaN
## Hunts Point - Mott Haven-Greenpoint                                     NaN NaN
## Jamaica-Greenpoint                                                      NaN NaN
## Kingsbridge - Riverdale-Greenpoint                                      NaN NaN
## Long Island City - Astoria-Greenpoint                                   NaN NaN
## Lower Manhattan-Greenpoint                                              NaN NaN
## Northeast Bronx-Greenpoint                                              NaN NaN
## Pelham - Throgs Neck-Greenpoint                                         NaN NaN
## Port Richmond-Greenpoint                                                NaN NaN
## Ridgewood - Forest Hills-Greenpoint                                     NaN NaN
## Rockaways-Greenpoint                                                    NaN NaN
## South Beach - Tottenville-Greenpoint                                    NaN NaN
## Southeast Queens-Greenpoint                                             NaN NaN
## Southwest Queens-Greenpoint                                             NaN NaN
## Stapleton - St. George-Greenpoint                                       NaN NaN
## Sunset Park-Greenpoint                                                  NaN NaN
## Union Square - Lower East Side-Greenpoint                               NaN NaN
## Upper East Side-Greenpoint                                              NaN NaN
## Upper West Side-Greenpoint                                              NaN NaN
## Washington Heights-Greenpoint                                           NaN NaN
## West Queens-Greenpoint                                                  NaN NaN
## Williamsburg - Bushwick-Greenpoint                                      NaN NaN
## Willowbrook-Greenpoint                                                  NaN NaN
## High Bridge - Morrisania-Greenwich Village - SoHo                       NaN NaN
## Hunts Point - Mott Haven-Greenwich Village - SoHo                       NaN NaN
## Jamaica-Greenwich Village - SoHo                                        NaN NaN
## Kingsbridge - Riverdale-Greenwich Village - SoHo                        NaN NaN
## Long Island City - Astoria-Greenwich Village - SoHo                     NaN NaN
## Lower Manhattan-Greenwich Village - SoHo                                NaN NaN
## Northeast Bronx-Greenwich Village - SoHo                                NaN NaN
## Pelham - Throgs Neck-Greenwich Village - SoHo                           NaN NaN
## Port Richmond-Greenwich Village - SoHo                                  NaN NaN
## Ridgewood - Forest Hills-Greenwich Village - SoHo                       NaN NaN
## Rockaways-Greenwich Village - SoHo                                      NaN NaN
## South Beach - Tottenville-Greenwich Village - SoHo                      NaN NaN
## Southeast Queens-Greenwich Village - SoHo                               NaN NaN
## Southwest Queens-Greenwich Village - SoHo                               NaN NaN
## Stapleton - St. George-Greenwich Village - SoHo                         NaN NaN
## Sunset Park-Greenwich Village - SoHo                                    NaN NaN
## Union Square - Lower East Side-Greenwich Village - SoHo                 NaN NaN
## Upper East Side-Greenwich Village - SoHo                                NaN NaN
## Upper West Side-Greenwich Village - SoHo                                NaN NaN
## Washington Heights-Greenwich Village - SoHo                             NaN NaN
## West Queens-Greenwich Village - SoHo                                    NaN NaN
## Williamsburg - Bushwick-Greenwich Village - SoHo                        NaN NaN
## Willowbrook-Greenwich Village - SoHo                                    NaN NaN
## Hunts Point - Mott Haven-High Bridge - Morrisania                       NaN NaN
## Jamaica-High Bridge - Morrisania                                        NaN NaN
## Kingsbridge - Riverdale-High Bridge - Morrisania                        NaN NaN
## Long Island City - Astoria-High Bridge - Morrisania                     NaN NaN
## Lower Manhattan-High Bridge - Morrisania                                NaN NaN
## Northeast Bronx-High Bridge - Morrisania                                NaN NaN
## Pelham - Throgs Neck-High Bridge - Morrisania                           NaN NaN
## Port Richmond-High Bridge - Morrisania                                  NaN NaN
## Ridgewood - Forest Hills-High Bridge - Morrisania                       NaN NaN
## Rockaways-High Bridge - Morrisania                                      NaN NaN
## South Beach - Tottenville-High Bridge - Morrisania                      NaN NaN
## Southeast Queens-High Bridge - Morrisania                               NaN NaN
## Southwest Queens-High Bridge - Morrisania                               NaN NaN
## Stapleton - St. George-High Bridge - Morrisania                         NaN NaN
## Sunset Park-High Bridge - Morrisania                                    NaN NaN
## Union Square - Lower East Side-High Bridge - Morrisania                 NaN NaN
## Upper East Side-High Bridge - Morrisania                                NaN NaN
## Upper West Side-High Bridge - Morrisania                                NaN NaN
## Washington Heights-High Bridge - Morrisania                             NaN NaN
## West Queens-High Bridge - Morrisania                                    NaN NaN
## Williamsburg - Bushwick-High Bridge - Morrisania                        NaN NaN
## Willowbrook-High Bridge - Morrisania                                    NaN NaN
## Jamaica-Hunts Point - Mott Haven                                        NaN NaN
## Kingsbridge - Riverdale-Hunts Point - Mott Haven                        NaN NaN
## Long Island City - Astoria-Hunts Point - Mott Haven                     NaN NaN
## Lower Manhattan-Hunts Point - Mott Haven                                NaN NaN
## Northeast Bronx-Hunts Point - Mott Haven                                NaN NaN
## Pelham - Throgs Neck-Hunts Point - Mott Haven                           NaN NaN
## Port Richmond-Hunts Point - Mott Haven                                  NaN NaN
## Ridgewood - Forest Hills-Hunts Point - Mott Haven                       NaN NaN
## Rockaways-Hunts Point - Mott Haven                                      NaN NaN
## South Beach - Tottenville-Hunts Point - Mott Haven                      NaN NaN
## Southeast Queens-Hunts Point - Mott Haven                               NaN NaN
## Southwest Queens-Hunts Point - Mott Haven                               NaN NaN
## Stapleton - St. George-Hunts Point - Mott Haven                         NaN NaN
## Sunset Park-Hunts Point - Mott Haven                                    NaN NaN
## Union Square - Lower East Side-Hunts Point - Mott Haven                 NaN NaN
## Upper East Side-Hunts Point - Mott Haven                                NaN NaN
## Upper West Side-Hunts Point - Mott Haven                                NaN NaN
## Washington Heights-Hunts Point - Mott Haven                             NaN NaN
## West Queens-Hunts Point - Mott Haven                                    NaN NaN
## Williamsburg - Bushwick-Hunts Point - Mott Haven                        NaN NaN
## Willowbrook-Hunts Point - Mott Haven                                    NaN NaN
## Kingsbridge - Riverdale-Jamaica                                         NaN NaN
## Long Island City - Astoria-Jamaica                                      NaN NaN
## Lower Manhattan-Jamaica                                                 NaN NaN
## Northeast Bronx-Jamaica                                                 NaN NaN
## Pelham - Throgs Neck-Jamaica                                            NaN NaN
## Port Richmond-Jamaica                                                   NaN NaN
## Ridgewood - Forest Hills-Jamaica                                        NaN NaN
## Rockaways-Jamaica                                                       NaN NaN
## South Beach - Tottenville-Jamaica                                       NaN NaN
## Southeast Queens-Jamaica                                                NaN NaN
## Southwest Queens-Jamaica                                                NaN NaN
## Stapleton - St. George-Jamaica                                          NaN NaN
## Sunset Park-Jamaica                                                     NaN NaN
## Union Square - Lower East Side-Jamaica                                  NaN NaN
## Upper East Side-Jamaica                                                 NaN NaN
## Upper West Side-Jamaica                                                 NaN NaN
## Washington Heights-Jamaica                                              NaN NaN
## West Queens-Jamaica                                                     NaN NaN
## Williamsburg - Bushwick-Jamaica                                         NaN NaN
## Willowbrook-Jamaica                                                     NaN NaN
## Long Island City - Astoria-Kingsbridge - Riverdale                      NaN NaN
## Lower Manhattan-Kingsbridge - Riverdale                                 NaN NaN
## Northeast Bronx-Kingsbridge - Riverdale                                 NaN NaN
## Pelham - Throgs Neck-Kingsbridge - Riverdale                            NaN NaN
## Port Richmond-Kingsbridge - Riverdale                                   NaN NaN
## Ridgewood - Forest Hills-Kingsbridge - Riverdale                        NaN NaN
## Rockaways-Kingsbridge - Riverdale                                       NaN NaN
## South Beach - Tottenville-Kingsbridge - Riverdale                       NaN NaN
## Southeast Queens-Kingsbridge - Riverdale                                NaN NaN
## Southwest Queens-Kingsbridge - Riverdale                                NaN NaN
## Stapleton - St. George-Kingsbridge - Riverdale                          NaN NaN
## Sunset Park-Kingsbridge - Riverdale                                     NaN NaN
## Union Square - Lower East Side-Kingsbridge - Riverdale                  NaN NaN
## Upper East Side-Kingsbridge - Riverdale                                 NaN NaN
## Upper West Side-Kingsbridge - Riverdale                                 NaN NaN
## Washington Heights-Kingsbridge - Riverdale                              NaN NaN
## West Queens-Kingsbridge - Riverdale                                     NaN NaN
## Williamsburg - Bushwick-Kingsbridge - Riverdale                         NaN NaN
## Willowbrook-Kingsbridge - Riverdale                                     NaN NaN
## Lower Manhattan-Long Island City - Astoria                              NaN NaN
## Northeast Bronx-Long Island City - Astoria                              NaN NaN
## Pelham - Throgs Neck-Long Island City - Astoria                         NaN NaN
## Port Richmond-Long Island City - Astoria                                NaN NaN
## Ridgewood - Forest Hills-Long Island City - Astoria                     NaN NaN
## Rockaways-Long Island City - Astoria                                    NaN NaN
## South Beach - Tottenville-Long Island City - Astoria                    NaN NaN
## Southeast Queens-Long Island City - Astoria                             NaN NaN
## Southwest Queens-Long Island City - Astoria                             NaN NaN
## Stapleton - St. George-Long Island City - Astoria                       NaN NaN
## Sunset Park-Long Island City - Astoria                                  NaN NaN
## Union Square - Lower East Side-Long Island City - Astoria               NaN NaN
## Upper East Side-Long Island City - Astoria                              NaN NaN
## Upper West Side-Long Island City - Astoria                              NaN NaN
## Washington Heights-Long Island City - Astoria                           NaN NaN
## West Queens-Long Island City - Astoria                                  NaN NaN
## Williamsburg - Bushwick-Long Island City - Astoria                      NaN NaN
## Willowbrook-Long Island City - Astoria                                  NaN NaN
## Northeast Bronx-Lower Manhattan                                         NaN NaN
## Pelham - Throgs Neck-Lower Manhattan                                    NaN NaN
## Port Richmond-Lower Manhattan                                           NaN NaN
## Ridgewood - Forest Hills-Lower Manhattan                                NaN NaN
## Rockaways-Lower Manhattan                                               NaN NaN
## South Beach - Tottenville-Lower Manhattan                               NaN NaN
## Southeast Queens-Lower Manhattan                                        NaN NaN
## Southwest Queens-Lower Manhattan                                        NaN NaN
## Stapleton - St. George-Lower Manhattan                                  NaN NaN
## Sunset Park-Lower Manhattan                                             NaN NaN
## Union Square - Lower East Side-Lower Manhattan                          NaN NaN
## Upper East Side-Lower Manhattan                                         NaN NaN
## Upper West Side-Lower Manhattan                                         NaN NaN
## Washington Heights-Lower Manhattan                                      NaN NaN
## West Queens-Lower Manhattan                                             NaN NaN
## Williamsburg - Bushwick-Lower Manhattan                                 NaN NaN
## Willowbrook-Lower Manhattan                                             NaN NaN
## Pelham - Throgs Neck-Northeast Bronx                                    NaN NaN
## Port Richmond-Northeast Bronx                                           NaN NaN
## Ridgewood - Forest Hills-Northeast Bronx                                NaN NaN
## Rockaways-Northeast Bronx                                               NaN NaN
## South Beach - Tottenville-Northeast Bronx                               NaN NaN
## Southeast Queens-Northeast Bronx                                        NaN NaN
## Southwest Queens-Northeast Bronx                                        NaN NaN
## Stapleton - St. George-Northeast Bronx                                  NaN NaN
## Sunset Park-Northeast Bronx                                             NaN NaN
## Union Square - Lower East Side-Northeast Bronx                          NaN NaN
## Upper East Side-Northeast Bronx                                         NaN NaN
## Upper West Side-Northeast Bronx                                         NaN NaN
## Washington Heights-Northeast Bronx                                      NaN NaN
## West Queens-Northeast Bronx                                             NaN NaN
## Williamsburg - Bushwick-Northeast Bronx                                 NaN NaN
## Willowbrook-Northeast Bronx                                             NaN NaN
## Port Richmond-Pelham - Throgs Neck                                      NaN NaN
## Ridgewood - Forest Hills-Pelham - Throgs Neck                           NaN NaN
## Rockaways-Pelham - Throgs Neck                                          NaN NaN
## South Beach - Tottenville-Pelham - Throgs Neck                          NaN NaN
## Southeast Queens-Pelham - Throgs Neck                                   NaN NaN
## Southwest Queens-Pelham - Throgs Neck                                   NaN NaN
## Stapleton - St. George-Pelham - Throgs Neck                             NaN NaN
## Sunset Park-Pelham - Throgs Neck                                        NaN NaN
## Union Square - Lower East Side-Pelham - Throgs Neck                     NaN NaN
## Upper East Side-Pelham - Throgs Neck                                    NaN NaN
## Upper West Side-Pelham - Throgs Neck                                    NaN NaN
## Washington Heights-Pelham - Throgs Neck                                 NaN NaN
## West Queens-Pelham - Throgs Neck                                        NaN NaN
## Williamsburg - Bushwick-Pelham - Throgs Neck                            NaN NaN
## Willowbrook-Pelham - Throgs Neck                                        NaN NaN
## Ridgewood - Forest Hills-Port Richmond                                  NaN NaN
## Rockaways-Port Richmond                                                 NaN NaN
## South Beach - Tottenville-Port Richmond                                 NaN NaN
## Southeast Queens-Port Richmond                                          NaN NaN
## Southwest Queens-Port Richmond                                          NaN NaN
## Stapleton - St. George-Port Richmond                                    NaN NaN
## Sunset Park-Port Richmond                                               NaN NaN
## Union Square - Lower East Side-Port Richmond                            NaN NaN
## Upper East Side-Port Richmond                                           NaN NaN
## Upper West Side-Port Richmond                                           NaN NaN
## Washington Heights-Port Richmond                                        NaN NaN
## West Queens-Port Richmond                                               NaN NaN
## Williamsburg - Bushwick-Port Richmond                                   NaN NaN
## Willowbrook-Port Richmond                                               NaN NaN
## Rockaways-Ridgewood - Forest Hills                                      NaN NaN
## South Beach - Tottenville-Ridgewood - Forest Hills                      NaN NaN
## Southeast Queens-Ridgewood - Forest Hills                               NaN NaN
## Southwest Queens-Ridgewood - Forest Hills                               NaN NaN
## Stapleton - St. George-Ridgewood - Forest Hills                         NaN NaN
## Sunset Park-Ridgewood - Forest Hills                                    NaN NaN
## Union Square - Lower East Side-Ridgewood - Forest Hills                 NaN NaN
## Upper East Side-Ridgewood - Forest Hills                                NaN NaN
## Upper West Side-Ridgewood - Forest Hills                                NaN NaN
## Washington Heights-Ridgewood - Forest Hills                             NaN NaN
## West Queens-Ridgewood - Forest Hills                                    NaN NaN
## Williamsburg - Bushwick-Ridgewood - Forest Hills                        NaN NaN
## Willowbrook-Ridgewood - Forest Hills                                    NaN NaN
## South Beach - Tottenville-Rockaways                                     NaN NaN
## Southeast Queens-Rockaways                                              NaN NaN
## Southwest Queens-Rockaways                                              NaN NaN
## Stapleton - St. George-Rockaways                                        NaN NaN
## Sunset Park-Rockaways                                                   NaN NaN
## Union Square - Lower East Side-Rockaways                                NaN NaN
## Upper East Side-Rockaways                                               NaN NaN
## Upper West Side-Rockaways                                               NaN NaN
## Washington Heights-Rockaways                                            NaN NaN
## West Queens-Rockaways                                                   NaN NaN
## Williamsburg - Bushwick-Rockaways                                       NaN NaN
## Willowbrook-Rockaways                                                   NaN NaN
## Southeast Queens-South Beach - Tottenville                              NaN NaN
## Southwest Queens-South Beach - Tottenville                              NaN NaN
## Stapleton - St. George-South Beach - Tottenville                        NaN NaN
## Sunset Park-South Beach - Tottenville                                   NaN NaN
## Union Square - Lower East Side-South Beach - Tottenville                NaN NaN
## Upper East Side-South Beach - Tottenville                               NaN NaN
## Upper West Side-South Beach - Tottenville                               NaN NaN
## Washington Heights-South Beach - Tottenville                            NaN NaN
## West Queens-South Beach - Tottenville                                   NaN NaN
## Williamsburg - Bushwick-South Beach - Tottenville                       NaN NaN
## Willowbrook-South Beach - Tottenville                                   NaN NaN
## Southwest Queens-Southeast Queens                                       NaN NaN
## Stapleton - St. George-Southeast Queens                                 NaN NaN
## Sunset Park-Southeast Queens                                            NaN NaN
## Union Square - Lower East Side-Southeast Queens                         NaN NaN
## Upper East Side-Southeast Queens                                        NaN NaN
## Upper West Side-Southeast Queens                                        NaN NaN
## Washington Heights-Southeast Queens                                     NaN NaN
## West Queens-Southeast Queens                                            NaN NaN
## Williamsburg - Bushwick-Southeast Queens                                NaN NaN
## Willowbrook-Southeast Queens                                            NaN NaN
## Stapleton - St. George-Southwest Queens                                 NaN NaN
## Sunset Park-Southwest Queens                                            NaN NaN
## Union Square - Lower East Side-Southwest Queens                         NaN NaN
## Upper East Side-Southwest Queens                                        NaN NaN
## Upper West Side-Southwest Queens                                        NaN NaN
## Washington Heights-Southwest Queens                                     NaN NaN
## West Queens-Southwest Queens                                            NaN NaN
## Williamsburg - Bushwick-Southwest Queens                                NaN NaN
## Willowbrook-Southwest Queens                                            NaN NaN
## Sunset Park-Stapleton - St. George                                      NaN NaN
## Union Square - Lower East Side-Stapleton - St. George                   NaN NaN
## Upper East Side-Stapleton - St. George                                  NaN NaN
## Upper West Side-Stapleton - St. George                                  NaN NaN
## Washington Heights-Stapleton - St. George                               NaN NaN
## West Queens-Stapleton - St. George                                      NaN NaN
## Williamsburg - Bushwick-Stapleton - St. George                          NaN NaN
## Willowbrook-Stapleton - St. George                                      NaN NaN
## Union Square - Lower East Side-Sunset Park                              NaN NaN
## Upper East Side-Sunset Park                                             NaN NaN
## Upper West Side-Sunset Park                                             NaN NaN
## Washington Heights-Sunset Park                                          NaN NaN
## West Queens-Sunset Park                                                 NaN NaN
## Williamsburg - Bushwick-Sunset Park                                     NaN NaN
## Willowbrook-Sunset Park                                                 NaN NaN
## Upper East Side-Union Square - Lower East Side                          NaN NaN
## Upper West Side-Union Square - Lower East Side                          NaN NaN
## Washington Heights-Union Square - Lower East Side                       NaN NaN
## West Queens-Union Square - Lower East Side                              NaN NaN
## Williamsburg - Bushwick-Union Square - Lower East Side                  NaN NaN
## Willowbrook-Union Square - Lower East Side                              NaN NaN
## Upper West Side-Upper East Side                                         NaN NaN
## Washington Heights-Upper East Side                                      NaN NaN
## West Queens-Upper East Side                                             NaN NaN
## Williamsburg - Bushwick-Upper East Side                                 NaN NaN
## Willowbrook-Upper East Side                                             NaN NaN
## Washington Heights-Upper West Side                                      NaN NaN
## West Queens-Upper West Side                                             NaN NaN
## Williamsburg - Bushwick-Upper West Side                                 NaN NaN
## Willowbrook-Upper West Side                                             NaN NaN
## West Queens-Washington Heights                                          NaN NaN
## Williamsburg - Bushwick-Washington Heights                              NaN NaN
## Willowbrook-Washington Heights                                          NaN NaN
## Williamsburg - Bushwick-West Queens                                     NaN NaN
## Willowbrook-West Queens                                                 NaN NaN
## Willowbrook-Williamsburg - Bushwick                                     NaN NaN
##                                                                         p adj
## Bedford Stuyvesant - Crown Heights-Bayside - Little Neck                  NaN
## Bensonhurst - Bay Ridge-Bayside - Little Neck                             NaN
## Borough Park-Bayside - Little Neck                                        NaN
## Canarsie - Flatlands-Bayside - Little Neck                                NaN
## Central Harlem - Morningside Heights-Bayside - Little Neck                NaN
## Chelsea - Clinton-Bayside - Little Neck                                   NaN
## Coney Island - Sheepshead Bay-Bayside - Little Neck                       NaN
## Crotona -Tremont-Bayside - Little Neck                                    NaN
## Downtown - Heights - Slope-Bayside - Little Neck                          NaN
## East Flatbush - Flatbush-Bayside - Little Neck                            NaN
## East Harlem-Bayside - Little Neck                                         NaN
## East New York-Bayside - Little Neck                                       NaN
## Flushing - Clearview-Bayside - Little Neck                                NaN
## Fordham - Bronx Pk-Bayside - Little Neck                                  NaN
## Fresh Meadows-Bayside - Little Neck                                       NaN
## Gramercy Park - Murray Hill-Bayside - Little Neck                         NaN
## Greenpoint-Bayside - Little Neck                                          NaN
## Greenwich Village - SoHo-Bayside - Little Neck                            NaN
## High Bridge - Morrisania-Bayside - Little Neck                            NaN
## Hunts Point - Mott Haven-Bayside - Little Neck                            NaN
## Jamaica-Bayside - Little Neck                                             NaN
## Kingsbridge - Riverdale-Bayside - Little Neck                             NaN
## Long Island City - Astoria-Bayside - Little Neck                          NaN
## Lower Manhattan-Bayside - Little Neck                                     NaN
## Northeast Bronx-Bayside - Little Neck                                     NaN
## Pelham - Throgs Neck-Bayside - Little Neck                                NaN
## Port Richmond-Bayside - Little Neck                                       NaN
## Ridgewood - Forest Hills-Bayside - Little Neck                            NaN
## Rockaways-Bayside - Little Neck                                           NaN
## South Beach - Tottenville-Bayside - Little Neck                           NaN
## Southeast Queens-Bayside - Little Neck                                    NaN
## Southwest Queens-Bayside - Little Neck                                    NaN
## Stapleton - St. George-Bayside - Little Neck                              NaN
## Sunset Park-Bayside - Little Neck                                         NaN
## Union Square - Lower East Side-Bayside - Little Neck                      NaN
## Upper East Side-Bayside - Little Neck                                     NaN
## Upper West Side-Bayside - Little Neck                                     NaN
## Washington Heights-Bayside - Little Neck                                  NaN
## West Queens-Bayside - Little Neck                                         NaN
## Williamsburg - Bushwick-Bayside - Little Neck                             NaN
## Willowbrook-Bayside - Little Neck                                         NaN
## Bensonhurst - Bay Ridge-Bedford Stuyvesant - Crown Heights                NaN
## Borough Park-Bedford Stuyvesant - Crown Heights                           NaN
## Canarsie - Flatlands-Bedford Stuyvesant - Crown Heights                   NaN
## Central Harlem - Morningside Heights-Bedford Stuyvesant - Crown Heights   NaN
## Chelsea - Clinton-Bedford Stuyvesant - Crown Heights                      NaN
## Coney Island - Sheepshead Bay-Bedford Stuyvesant - Crown Heights          NaN
## Crotona -Tremont-Bedford Stuyvesant - Crown Heights                       NaN
## Downtown - Heights - Slope-Bedford Stuyvesant - Crown Heights             NaN
## East Flatbush - Flatbush-Bedford Stuyvesant - Crown Heights               NaN
## East Harlem-Bedford Stuyvesant - Crown Heights                            NaN
## East New York-Bedford Stuyvesant - Crown Heights                          NaN
## Flushing - Clearview-Bedford Stuyvesant - Crown Heights                   NaN
## Fordham - Bronx Pk-Bedford Stuyvesant - Crown Heights                     NaN
## Fresh Meadows-Bedford Stuyvesant - Crown Heights                          NaN
## Gramercy Park - Murray Hill-Bedford Stuyvesant - Crown Heights            NaN
## Greenpoint-Bedford Stuyvesant - Crown Heights                             NaN
## Greenwich Village - SoHo-Bedford Stuyvesant - Crown Heights               NaN
## High Bridge - Morrisania-Bedford Stuyvesant - Crown Heights               NaN
## Hunts Point - Mott Haven-Bedford Stuyvesant - Crown Heights               NaN
## Jamaica-Bedford Stuyvesant - Crown Heights                                NaN
## Kingsbridge - Riverdale-Bedford Stuyvesant - Crown Heights                NaN
## Long Island City - Astoria-Bedford Stuyvesant - Crown Heights             NaN
## Lower Manhattan-Bedford Stuyvesant - Crown Heights                        NaN
## Northeast Bronx-Bedford Stuyvesant - Crown Heights                        NaN
## Pelham - Throgs Neck-Bedford Stuyvesant - Crown Heights                   NaN
## Port Richmond-Bedford Stuyvesant - Crown Heights                          NaN
## Ridgewood - Forest Hills-Bedford Stuyvesant - Crown Heights               NaN
## Rockaways-Bedford Stuyvesant - Crown Heights                              NaN
## South Beach - Tottenville-Bedford Stuyvesant - Crown Heights              NaN
## Southeast Queens-Bedford Stuyvesant - Crown Heights                       NaN
## Southwest Queens-Bedford Stuyvesant - Crown Heights                       NaN
## Stapleton - St. George-Bedford Stuyvesant - Crown Heights                 NaN
## Sunset Park-Bedford Stuyvesant - Crown Heights                            NaN
## Union Square - Lower East Side-Bedford Stuyvesant - Crown Heights         NaN
## Upper East Side-Bedford Stuyvesant - Crown Heights                        NaN
## Upper West Side-Bedford Stuyvesant - Crown Heights                        NaN
## Washington Heights-Bedford Stuyvesant - Crown Heights                     NaN
## West Queens-Bedford Stuyvesant - Crown Heights                            NaN
## Williamsburg - Bushwick-Bedford Stuyvesant - Crown Heights                NaN
## Willowbrook-Bedford Stuyvesant - Crown Heights                            NaN
## Borough Park-Bensonhurst - Bay Ridge                                      NaN
## Canarsie - Flatlands-Bensonhurst - Bay Ridge                              NaN
## Central Harlem - Morningside Heights-Bensonhurst - Bay Ridge              NaN
## Chelsea - Clinton-Bensonhurst - Bay Ridge                                 NaN
## Coney Island - Sheepshead Bay-Bensonhurst - Bay Ridge                     NaN
## Crotona -Tremont-Bensonhurst - Bay Ridge                                  NaN
## Downtown - Heights - Slope-Bensonhurst - Bay Ridge                        NaN
## East Flatbush - Flatbush-Bensonhurst - Bay Ridge                          NaN
## East Harlem-Bensonhurst - Bay Ridge                                       NaN
## East New York-Bensonhurst - Bay Ridge                                     NaN
## Flushing - Clearview-Bensonhurst - Bay Ridge                              NaN
## Fordham - Bronx Pk-Bensonhurst - Bay Ridge                                NaN
## Fresh Meadows-Bensonhurst - Bay Ridge                                     NaN
## Gramercy Park - Murray Hill-Bensonhurst - Bay Ridge                       NaN
## Greenpoint-Bensonhurst - Bay Ridge                                        NaN
## Greenwich Village - SoHo-Bensonhurst - Bay Ridge                          NaN
## High Bridge - Morrisania-Bensonhurst - Bay Ridge                          NaN
## Hunts Point - Mott Haven-Bensonhurst - Bay Ridge                          NaN
## Jamaica-Bensonhurst - Bay Ridge                                           NaN
## Kingsbridge - Riverdale-Bensonhurst - Bay Ridge                           NaN
## Long Island City - Astoria-Bensonhurst - Bay Ridge                        NaN
## Lower Manhattan-Bensonhurst - Bay Ridge                                   NaN
## Northeast Bronx-Bensonhurst - Bay Ridge                                   NaN
## Pelham - Throgs Neck-Bensonhurst - Bay Ridge                              NaN
## Port Richmond-Bensonhurst - Bay Ridge                                     NaN
## Ridgewood - Forest Hills-Bensonhurst - Bay Ridge                          NaN
## Rockaways-Bensonhurst - Bay Ridge                                         NaN
## South Beach - Tottenville-Bensonhurst - Bay Ridge                         NaN
## Southeast Queens-Bensonhurst - Bay Ridge                                  NaN
## Southwest Queens-Bensonhurst - Bay Ridge                                  NaN
## Stapleton - St. George-Bensonhurst - Bay Ridge                            NaN
## Sunset Park-Bensonhurst - Bay Ridge                                       NaN
## Union Square - Lower East Side-Bensonhurst - Bay Ridge                    NaN
## Upper East Side-Bensonhurst - Bay Ridge                                   NaN
## Upper West Side-Bensonhurst - Bay Ridge                                   NaN
## Washington Heights-Bensonhurst - Bay Ridge                                NaN
## West Queens-Bensonhurst - Bay Ridge                                       NaN
## Williamsburg - Bushwick-Bensonhurst - Bay Ridge                           NaN
## Willowbrook-Bensonhurst - Bay Ridge                                       NaN
## Canarsie - Flatlands-Borough Park                                         NaN
## Central Harlem - Morningside Heights-Borough Park                         NaN
## Chelsea - Clinton-Borough Park                                            NaN
## Coney Island - Sheepshead Bay-Borough Park                                NaN
## Crotona -Tremont-Borough Park                                             NaN
## Downtown - Heights - Slope-Borough Park                                   NaN
## East Flatbush - Flatbush-Borough Park                                     NaN
## East Harlem-Borough Park                                                  NaN
## East New York-Borough Park                                                NaN
## Flushing - Clearview-Borough Park                                         NaN
## Fordham - Bronx Pk-Borough Park                                           NaN
## Fresh Meadows-Borough Park                                                NaN
## Gramercy Park - Murray Hill-Borough Park                                  NaN
## Greenpoint-Borough Park                                                   NaN
## Greenwich Village - SoHo-Borough Park                                     NaN
## High Bridge - Morrisania-Borough Park                                     NaN
## Hunts Point - Mott Haven-Borough Park                                     NaN
## Jamaica-Borough Park                                                      NaN
## Kingsbridge - Riverdale-Borough Park                                      NaN
## Long Island City - Astoria-Borough Park                                   NaN
## Lower Manhattan-Borough Park                                              NaN
## Northeast Bronx-Borough Park                                              NaN
## Pelham - Throgs Neck-Borough Park                                         NaN
## Port Richmond-Borough Park                                                NaN
## Ridgewood - Forest Hills-Borough Park                                     NaN
## Rockaways-Borough Park                                                    NaN
## South Beach - Tottenville-Borough Park                                    NaN
## Southeast Queens-Borough Park                                             NaN
## Southwest Queens-Borough Park                                             NaN
## Stapleton - St. George-Borough Park                                       NaN
## Sunset Park-Borough Park                                                  NaN
## Union Square - Lower East Side-Borough Park                               NaN
## Upper East Side-Borough Park                                              NaN
## Upper West Side-Borough Park                                              NaN
## Washington Heights-Borough Park                                           NaN
## West Queens-Borough Park                                                  NaN
## Williamsburg - Bushwick-Borough Park                                      NaN
## Willowbrook-Borough Park                                                  NaN
## Central Harlem - Morningside Heights-Canarsie - Flatlands                 NaN
## Chelsea - Clinton-Canarsie - Flatlands                                    NaN
## Coney Island - Sheepshead Bay-Canarsie - Flatlands                        NaN
## Crotona -Tremont-Canarsie - Flatlands                                     NaN
## Downtown - Heights - Slope-Canarsie - Flatlands                           NaN
## East Flatbush - Flatbush-Canarsie - Flatlands                             NaN
## East Harlem-Canarsie - Flatlands                                          NaN
## East New York-Canarsie - Flatlands                                        NaN
## Flushing - Clearview-Canarsie - Flatlands                                 NaN
## Fordham - Bronx Pk-Canarsie - Flatlands                                   NaN
## Fresh Meadows-Canarsie - Flatlands                                        NaN
## Gramercy Park - Murray Hill-Canarsie - Flatlands                          NaN
## Greenpoint-Canarsie - Flatlands                                           NaN
## Greenwich Village - SoHo-Canarsie - Flatlands                             NaN
## High Bridge - Morrisania-Canarsie - Flatlands                             NaN
## Hunts Point - Mott Haven-Canarsie - Flatlands                             NaN
## Jamaica-Canarsie - Flatlands                                              NaN
## Kingsbridge - Riverdale-Canarsie - Flatlands                              NaN
## Long Island City - Astoria-Canarsie - Flatlands                           NaN
## Lower Manhattan-Canarsie - Flatlands                                      NaN
## Northeast Bronx-Canarsie - Flatlands                                      NaN
## Pelham - Throgs Neck-Canarsie - Flatlands                                 NaN
## Port Richmond-Canarsie - Flatlands                                        NaN
## Ridgewood - Forest Hills-Canarsie - Flatlands                             NaN
## Rockaways-Canarsie - Flatlands                                            NaN
## South Beach - Tottenville-Canarsie - Flatlands                            NaN
## Southeast Queens-Canarsie - Flatlands                                     NaN
## Southwest Queens-Canarsie - Flatlands                                     NaN
## Stapleton - St. George-Canarsie - Flatlands                               NaN
## Sunset Park-Canarsie - Flatlands                                          NaN
## Union Square - Lower East Side-Canarsie - Flatlands                       NaN
## Upper East Side-Canarsie - Flatlands                                      NaN
## Upper West Side-Canarsie - Flatlands                                      NaN
## Washington Heights-Canarsie - Flatlands                                   NaN
## West Queens-Canarsie - Flatlands                                          NaN
## Williamsburg - Bushwick-Canarsie - Flatlands                              NaN
## Willowbrook-Canarsie - Flatlands                                          NaN
## Chelsea - Clinton-Central Harlem - Morningside Heights                    NaN
## Coney Island - Sheepshead Bay-Central Harlem - Morningside Heights        NaN
## Crotona -Tremont-Central Harlem - Morningside Heights                     NaN
## Downtown - Heights - Slope-Central Harlem - Morningside Heights           NaN
## East Flatbush - Flatbush-Central Harlem - Morningside Heights             NaN
## East Harlem-Central Harlem - Morningside Heights                          NaN
## East New York-Central Harlem - Morningside Heights                        NaN
## Flushing - Clearview-Central Harlem - Morningside Heights                 NaN
## Fordham - Bronx Pk-Central Harlem - Morningside Heights                   NaN
## Fresh Meadows-Central Harlem - Morningside Heights                        NaN
## Gramercy Park - Murray Hill-Central Harlem - Morningside Heights          NaN
## Greenpoint-Central Harlem - Morningside Heights                           NaN
## Greenwich Village - SoHo-Central Harlem - Morningside Heights             NaN
## High Bridge - Morrisania-Central Harlem - Morningside Heights             NaN
## Hunts Point - Mott Haven-Central Harlem - Morningside Heights             NaN
## Jamaica-Central Harlem - Morningside Heights                              NaN
## Kingsbridge - Riverdale-Central Harlem - Morningside Heights              NaN
## Long Island City - Astoria-Central Harlem - Morningside Heights           NaN
## Lower Manhattan-Central Harlem - Morningside Heights                      NaN
## Northeast Bronx-Central Harlem - Morningside Heights                      NaN
## Pelham - Throgs Neck-Central Harlem - Morningside Heights                 NaN
## Port Richmond-Central Harlem - Morningside Heights                        NaN
## Ridgewood - Forest Hills-Central Harlem - Morningside Heights             NaN
## Rockaways-Central Harlem - Morningside Heights                            NaN
## South Beach - Tottenville-Central Harlem - Morningside Heights            NaN
## Southeast Queens-Central Harlem - Morningside Heights                     NaN
## Southwest Queens-Central Harlem - Morningside Heights                     NaN
## Stapleton - St. George-Central Harlem - Morningside Heights               NaN
## Sunset Park-Central Harlem - Morningside Heights                          NaN
## Union Square - Lower East Side-Central Harlem - Morningside Heights       NaN
## Upper East Side-Central Harlem - Morningside Heights                      NaN
## Upper West Side-Central Harlem - Morningside Heights                      NaN
## Washington Heights-Central Harlem - Morningside Heights                   NaN
## West Queens-Central Harlem - Morningside Heights                          NaN
## Williamsburg - Bushwick-Central Harlem - Morningside Heights              NaN
## Willowbrook-Central Harlem - Morningside Heights                          NaN
## Coney Island - Sheepshead Bay-Chelsea - Clinton                           NaN
## Crotona -Tremont-Chelsea - Clinton                                        NaN
## Downtown - Heights - Slope-Chelsea - Clinton                              NaN
## East Flatbush - Flatbush-Chelsea - Clinton                                NaN
## East Harlem-Chelsea - Clinton                                             NaN
## East New York-Chelsea - Clinton                                           NaN
## Flushing - Clearview-Chelsea - Clinton                                    NaN
## Fordham - Bronx Pk-Chelsea - Clinton                                      NaN
## Fresh Meadows-Chelsea - Clinton                                           NaN
## Gramercy Park - Murray Hill-Chelsea - Clinton                             NaN
## Greenpoint-Chelsea - Clinton                                              NaN
## Greenwich Village - SoHo-Chelsea - Clinton                                NaN
## High Bridge - Morrisania-Chelsea - Clinton                                NaN
## Hunts Point - Mott Haven-Chelsea - Clinton                                NaN
## Jamaica-Chelsea - Clinton                                                 NaN
## Kingsbridge - Riverdale-Chelsea - Clinton                                 NaN
## Long Island City - Astoria-Chelsea - Clinton                              NaN
## Lower Manhattan-Chelsea - Clinton                                         NaN
## Northeast Bronx-Chelsea - Clinton                                         NaN
## Pelham - Throgs Neck-Chelsea - Clinton                                    NaN
## Port Richmond-Chelsea - Clinton                                           NaN
## Ridgewood - Forest Hills-Chelsea - Clinton                                NaN
## Rockaways-Chelsea - Clinton                                               NaN
## South Beach - Tottenville-Chelsea - Clinton                               NaN
## Southeast Queens-Chelsea - Clinton                                        NaN
## Southwest Queens-Chelsea - Clinton                                        NaN
## Stapleton - St. George-Chelsea - Clinton                                  NaN
## Sunset Park-Chelsea - Clinton                                             NaN
## Union Square - Lower East Side-Chelsea - Clinton                          NaN
## Upper East Side-Chelsea - Clinton                                         NaN
## Upper West Side-Chelsea - Clinton                                         NaN
## Washington Heights-Chelsea - Clinton                                      NaN
## West Queens-Chelsea - Clinton                                             NaN
## Williamsburg - Bushwick-Chelsea - Clinton                                 NaN
## Willowbrook-Chelsea - Clinton                                             NaN
## Crotona -Tremont-Coney Island - Sheepshead Bay                            NaN
## Downtown - Heights - Slope-Coney Island - Sheepshead Bay                  NaN
## East Flatbush - Flatbush-Coney Island - Sheepshead Bay                    NaN
## East Harlem-Coney Island - Sheepshead Bay                                 NaN
## East New York-Coney Island - Sheepshead Bay                               NaN
## Flushing - Clearview-Coney Island - Sheepshead Bay                        NaN
## Fordham - Bronx Pk-Coney Island - Sheepshead Bay                          NaN
## Fresh Meadows-Coney Island - Sheepshead Bay                               NaN
## Gramercy Park - Murray Hill-Coney Island - Sheepshead Bay                 NaN
## Greenpoint-Coney Island - Sheepshead Bay                                  NaN
## Greenwich Village - SoHo-Coney Island - Sheepshead Bay                    NaN
## High Bridge - Morrisania-Coney Island - Sheepshead Bay                    NaN
## Hunts Point - Mott Haven-Coney Island - Sheepshead Bay                    NaN
## Jamaica-Coney Island - Sheepshead Bay                                     NaN
## Kingsbridge - Riverdale-Coney Island - Sheepshead Bay                     NaN
## Long Island City - Astoria-Coney Island - Sheepshead Bay                  NaN
## Lower Manhattan-Coney Island - Sheepshead Bay                             NaN
## Northeast Bronx-Coney Island - Sheepshead Bay                             NaN
## Pelham - Throgs Neck-Coney Island - Sheepshead Bay                        NaN
## Port Richmond-Coney Island - Sheepshead Bay                               NaN
## Ridgewood - Forest Hills-Coney Island - Sheepshead Bay                    NaN
## Rockaways-Coney Island - Sheepshead Bay                                   NaN
## South Beach - Tottenville-Coney Island - Sheepshead Bay                   NaN
## Southeast Queens-Coney Island - Sheepshead Bay                            NaN
## Southwest Queens-Coney Island - Sheepshead Bay                            NaN
## Stapleton - St. George-Coney Island - Sheepshead Bay                      NaN
## Sunset Park-Coney Island - Sheepshead Bay                                 NaN
## Union Square - Lower East Side-Coney Island - Sheepshead Bay              NaN
## Upper East Side-Coney Island - Sheepshead Bay                             NaN
## Upper West Side-Coney Island - Sheepshead Bay                             NaN
## Washington Heights-Coney Island - Sheepshead Bay                          NaN
## West Queens-Coney Island - Sheepshead Bay                                 NaN
## Williamsburg - Bushwick-Coney Island - Sheepshead Bay                     NaN
## Willowbrook-Coney Island - Sheepshead Bay                                 NaN
## Downtown - Heights - Slope-Crotona -Tremont                               NaN
## East Flatbush - Flatbush-Crotona -Tremont                                 NaN
## East Harlem-Crotona -Tremont                                              NaN
## East New York-Crotona -Tremont                                            NaN
## Flushing - Clearview-Crotona -Tremont                                     NaN
## Fordham - Bronx Pk-Crotona -Tremont                                       NaN
## Fresh Meadows-Crotona -Tremont                                            NaN
## Gramercy Park - Murray Hill-Crotona -Tremont                              NaN
## Greenpoint-Crotona -Tremont                                               NaN
## Greenwich Village - SoHo-Crotona -Tremont                                 NaN
## High Bridge - Morrisania-Crotona -Tremont                                 NaN
## Hunts Point - Mott Haven-Crotona -Tremont                                 NaN
## Jamaica-Crotona -Tremont                                                  NaN
## Kingsbridge - Riverdale-Crotona -Tremont                                  NaN
## Long Island City - Astoria-Crotona -Tremont                               NaN
## Lower Manhattan-Crotona -Tremont                                          NaN
## Northeast Bronx-Crotona -Tremont                                          NaN
## Pelham - Throgs Neck-Crotona -Tremont                                     NaN
## Port Richmond-Crotona -Tremont                                            NaN
## Ridgewood - Forest Hills-Crotona -Tremont                                 NaN
## Rockaways-Crotona -Tremont                                                NaN
## South Beach - Tottenville-Crotona -Tremont                                NaN
## Southeast Queens-Crotona -Tremont                                         NaN
## Southwest Queens-Crotona -Tremont                                         NaN
## Stapleton - St. George-Crotona -Tremont                                   NaN
## Sunset Park-Crotona -Tremont                                              NaN
## Union Square - Lower East Side-Crotona -Tremont                           NaN
## Upper East Side-Crotona -Tremont                                          NaN
## Upper West Side-Crotona -Tremont                                          NaN
## Washington Heights-Crotona -Tremont                                       NaN
## West Queens-Crotona -Tremont                                              NaN
## Williamsburg - Bushwick-Crotona -Tremont                                  NaN
## Willowbrook-Crotona -Tremont                                              NaN
## East Flatbush - Flatbush-Downtown - Heights - Slope                       NaN
## East Harlem-Downtown - Heights - Slope                                    NaN
## East New York-Downtown - Heights - Slope                                  NaN
## Flushing - Clearview-Downtown - Heights - Slope                           NaN
## Fordham - Bronx Pk-Downtown - Heights - Slope                             NaN
## Fresh Meadows-Downtown - Heights - Slope                                  NaN
## Gramercy Park - Murray Hill-Downtown - Heights - Slope                    NaN
## Greenpoint-Downtown - Heights - Slope                                     NaN
## Greenwich Village - SoHo-Downtown - Heights - Slope                       NaN
## High Bridge - Morrisania-Downtown - Heights - Slope                       NaN
## Hunts Point - Mott Haven-Downtown - Heights - Slope                       NaN
## Jamaica-Downtown - Heights - Slope                                        NaN
## Kingsbridge - Riverdale-Downtown - Heights - Slope                        NaN
## Long Island City - Astoria-Downtown - Heights - Slope                     NaN
## Lower Manhattan-Downtown - Heights - Slope                                NaN
## Northeast Bronx-Downtown - Heights - Slope                                NaN
## Pelham - Throgs Neck-Downtown - Heights - Slope                           NaN
## Port Richmond-Downtown - Heights - Slope                                  NaN
## Ridgewood - Forest Hills-Downtown - Heights - Slope                       NaN
## Rockaways-Downtown - Heights - Slope                                      NaN
## South Beach - Tottenville-Downtown - Heights - Slope                      NaN
## Southeast Queens-Downtown - Heights - Slope                               NaN
## Southwest Queens-Downtown - Heights - Slope                               NaN
## Stapleton - St. George-Downtown - Heights - Slope                         NaN
## Sunset Park-Downtown - Heights - Slope                                    NaN
## Union Square - Lower East Side-Downtown - Heights - Slope                 NaN
## Upper East Side-Downtown - Heights - Slope                                NaN
## Upper West Side-Downtown - Heights - Slope                                NaN
## Washington Heights-Downtown - Heights - Slope                             NaN
## West Queens-Downtown - Heights - Slope                                    NaN
## Williamsburg - Bushwick-Downtown - Heights - Slope                        NaN
## Willowbrook-Downtown - Heights - Slope                                    NaN
## East Harlem-East Flatbush - Flatbush                                      NaN
## East New York-East Flatbush - Flatbush                                    NaN
## Flushing - Clearview-East Flatbush - Flatbush                             NaN
## Fordham - Bronx Pk-East Flatbush - Flatbush                               NaN
## Fresh Meadows-East Flatbush - Flatbush                                    NaN
## Gramercy Park - Murray Hill-East Flatbush - Flatbush                      NaN
## Greenpoint-East Flatbush - Flatbush                                       NaN
## Greenwich Village - SoHo-East Flatbush - Flatbush                         NaN
## High Bridge - Morrisania-East Flatbush - Flatbush                         NaN
## Hunts Point - Mott Haven-East Flatbush - Flatbush                         NaN
## Jamaica-East Flatbush - Flatbush                                          NaN
## Kingsbridge - Riverdale-East Flatbush - Flatbush                          NaN
## Long Island City - Astoria-East Flatbush - Flatbush                       NaN
## Lower Manhattan-East Flatbush - Flatbush                                  NaN
## Northeast Bronx-East Flatbush - Flatbush                                  NaN
## Pelham - Throgs Neck-East Flatbush - Flatbush                             NaN
## Port Richmond-East Flatbush - Flatbush                                    NaN
## Ridgewood - Forest Hills-East Flatbush - Flatbush                         NaN
## Rockaways-East Flatbush - Flatbush                                        NaN
## South Beach - Tottenville-East Flatbush - Flatbush                        NaN
## Southeast Queens-East Flatbush - Flatbush                                 NaN
## Southwest Queens-East Flatbush - Flatbush                                 NaN
## Stapleton - St. George-East Flatbush - Flatbush                           NaN
## Sunset Park-East Flatbush - Flatbush                                      NaN
## Union Square - Lower East Side-East Flatbush - Flatbush                   NaN
## Upper East Side-East Flatbush - Flatbush                                  NaN
## Upper West Side-East Flatbush - Flatbush                                  NaN
## Washington Heights-East Flatbush - Flatbush                               NaN
## West Queens-East Flatbush - Flatbush                                      NaN
## Williamsburg - Bushwick-East Flatbush - Flatbush                          NaN
## Willowbrook-East Flatbush - Flatbush                                      NaN
## East New York-East Harlem                                                 NaN
## Flushing - Clearview-East Harlem                                          NaN
## Fordham - Bronx Pk-East Harlem                                            NaN
## Fresh Meadows-East Harlem                                                 NaN
## Gramercy Park - Murray Hill-East Harlem                                   NaN
## Greenpoint-East Harlem                                                    NaN
## Greenwich Village - SoHo-East Harlem                                      NaN
## High Bridge - Morrisania-East Harlem                                      NaN
## Hunts Point - Mott Haven-East Harlem                                      NaN
## Jamaica-East Harlem                                                       NaN
## Kingsbridge - Riverdale-East Harlem                                       NaN
## Long Island City - Astoria-East Harlem                                    NaN
## Lower Manhattan-East Harlem                                               NaN
## Northeast Bronx-East Harlem                                               NaN
## Pelham - Throgs Neck-East Harlem                                          NaN
## Port Richmond-East Harlem                                                 NaN
## Ridgewood - Forest Hills-East Harlem                                      NaN
## Rockaways-East Harlem                                                     NaN
## South Beach - Tottenville-East Harlem                                     NaN
## Southeast Queens-East Harlem                                              NaN
## Southwest Queens-East Harlem                                              NaN
## Stapleton - St. George-East Harlem                                        NaN
## Sunset Park-East Harlem                                                   NaN
## Union Square - Lower East Side-East Harlem                                NaN
## Upper East Side-East Harlem                                               NaN
## Upper West Side-East Harlem                                               NaN
## Washington Heights-East Harlem                                            NaN
## West Queens-East Harlem                                                   NaN
## Williamsburg - Bushwick-East Harlem                                       NaN
## Willowbrook-East Harlem                                                   NaN
## Flushing - Clearview-East New York                                        NaN
## Fordham - Bronx Pk-East New York                                          NaN
## Fresh Meadows-East New York                                               NaN
## Gramercy Park - Murray Hill-East New York                                 NaN
## Greenpoint-East New York                                                  NaN
## Greenwich Village - SoHo-East New York                                    NaN
## High Bridge - Morrisania-East New York                                    NaN
## Hunts Point - Mott Haven-East New York                                    NaN
## Jamaica-East New York                                                     NaN
## Kingsbridge - Riverdale-East New York                                     NaN
## Long Island City - Astoria-East New York                                  NaN
## Lower Manhattan-East New York                                             NaN
## Northeast Bronx-East New York                                             NaN
## Pelham - Throgs Neck-East New York                                        NaN
## Port Richmond-East New York                                               NaN
## Ridgewood - Forest Hills-East New York                                    NaN
## Rockaways-East New York                                                   NaN
## South Beach - Tottenville-East New York                                   NaN
## Southeast Queens-East New York                                            NaN
## Southwest Queens-East New York                                            NaN
## Stapleton - St. George-East New York                                      NaN
## Sunset Park-East New York                                                 NaN
## Union Square - Lower East Side-East New York                              NaN
## Upper East Side-East New York                                             NaN
## Upper West Side-East New York                                             NaN
## Washington Heights-East New York                                          NaN
## West Queens-East New York                                                 NaN
## Williamsburg - Bushwick-East New York                                     NaN
## Willowbrook-East New York                                                 NaN
## Fordham - Bronx Pk-Flushing - Clearview                                   NaN
## Fresh Meadows-Flushing - Clearview                                        NaN
## Gramercy Park - Murray Hill-Flushing - Clearview                          NaN
## Greenpoint-Flushing - Clearview                                           NaN
## Greenwich Village - SoHo-Flushing - Clearview                             NaN
## High Bridge - Morrisania-Flushing - Clearview                             NaN
## Hunts Point - Mott Haven-Flushing - Clearview                             NaN
## Jamaica-Flushing - Clearview                                              NaN
## Kingsbridge - Riverdale-Flushing - Clearview                              NaN
## Long Island City - Astoria-Flushing - Clearview                           NaN
## Lower Manhattan-Flushing - Clearview                                      NaN
## Northeast Bronx-Flushing - Clearview                                      NaN
## Pelham - Throgs Neck-Flushing - Clearview                                 NaN
## Port Richmond-Flushing - Clearview                                        NaN
## Ridgewood - Forest Hills-Flushing - Clearview                             NaN
## Rockaways-Flushing - Clearview                                            NaN
## South Beach - Tottenville-Flushing - Clearview                            NaN
## Southeast Queens-Flushing - Clearview                                     NaN
## Southwest Queens-Flushing - Clearview                                     NaN
## Stapleton - St. George-Flushing - Clearview                               NaN
## Sunset Park-Flushing - Clearview                                          NaN
## Union Square - Lower East Side-Flushing - Clearview                       NaN
## Upper East Side-Flushing - Clearview                                      NaN
## Upper West Side-Flushing - Clearview                                      NaN
## Washington Heights-Flushing - Clearview                                   NaN
## West Queens-Flushing - Clearview                                          NaN
## Williamsburg - Bushwick-Flushing - Clearview                              NaN
## Willowbrook-Flushing - Clearview                                          NaN
## Fresh Meadows-Fordham - Bronx Pk                                          NaN
## Gramercy Park - Murray Hill-Fordham - Bronx Pk                            NaN
## Greenpoint-Fordham - Bronx Pk                                             NaN
## Greenwich Village - SoHo-Fordham - Bronx Pk                               NaN
## High Bridge - Morrisania-Fordham - Bronx Pk                               NaN
## Hunts Point - Mott Haven-Fordham - Bronx Pk                               NaN
## Jamaica-Fordham - Bronx Pk                                                NaN
## Kingsbridge - Riverdale-Fordham - Bronx Pk                                NaN
## Long Island City - Astoria-Fordham - Bronx Pk                             NaN
## Lower Manhattan-Fordham - Bronx Pk                                        NaN
## Northeast Bronx-Fordham - Bronx Pk                                        NaN
## Pelham - Throgs Neck-Fordham - Bronx Pk                                   NaN
## Port Richmond-Fordham - Bronx Pk                                          NaN
## Ridgewood - Forest Hills-Fordham - Bronx Pk                               NaN
## Rockaways-Fordham - Bronx Pk                                              NaN
## South Beach - Tottenville-Fordham - Bronx Pk                              NaN
## Southeast Queens-Fordham - Bronx Pk                                       NaN
## Southwest Queens-Fordham - Bronx Pk                                       NaN
## Stapleton - St. George-Fordham - Bronx Pk                                 NaN
## Sunset Park-Fordham - Bronx Pk                                            NaN
## Union Square - Lower East Side-Fordham - Bronx Pk                         NaN
## Upper East Side-Fordham - Bronx Pk                                        NaN
## Upper West Side-Fordham - Bronx Pk                                        NaN
## Washington Heights-Fordham - Bronx Pk                                     NaN
## West Queens-Fordham - Bronx Pk                                            NaN
## Williamsburg - Bushwick-Fordham - Bronx Pk                                NaN
## Willowbrook-Fordham - Bronx Pk                                            NaN
## Gramercy Park - Murray Hill-Fresh Meadows                                 NaN
## Greenpoint-Fresh Meadows                                                  NaN
## Greenwich Village - SoHo-Fresh Meadows                                    NaN
## High Bridge - Morrisania-Fresh Meadows                                    NaN
## Hunts Point - Mott Haven-Fresh Meadows                                    NaN
## Jamaica-Fresh Meadows                                                     NaN
## Kingsbridge - Riverdale-Fresh Meadows                                     NaN
## Long Island City - Astoria-Fresh Meadows                                  NaN
## Lower Manhattan-Fresh Meadows                                             NaN
## Northeast Bronx-Fresh Meadows                                             NaN
## Pelham - Throgs Neck-Fresh Meadows                                        NaN
## Port Richmond-Fresh Meadows                                               NaN
## Ridgewood - Forest Hills-Fresh Meadows                                    NaN
## Rockaways-Fresh Meadows                                                   NaN
## South Beach - Tottenville-Fresh Meadows                                   NaN
## Southeast Queens-Fresh Meadows                                            NaN
## Southwest Queens-Fresh Meadows                                            NaN
## Stapleton - St. George-Fresh Meadows                                      NaN
## Sunset Park-Fresh Meadows                                                 NaN
## Union Square - Lower East Side-Fresh Meadows                              NaN
## Upper East Side-Fresh Meadows                                             NaN
## Upper West Side-Fresh Meadows                                             NaN
## Washington Heights-Fresh Meadows                                          NaN
## West Queens-Fresh Meadows                                                 NaN
## Williamsburg - Bushwick-Fresh Meadows                                     NaN
## Willowbrook-Fresh Meadows                                                 NaN
## Greenpoint-Gramercy Park - Murray Hill                                    NaN
## Greenwich Village - SoHo-Gramercy Park - Murray Hill                      NaN
## High Bridge - Morrisania-Gramercy Park - Murray Hill                      NaN
## Hunts Point - Mott Haven-Gramercy Park - Murray Hill                      NaN
## Jamaica-Gramercy Park - Murray Hill                                       NaN
## Kingsbridge - Riverdale-Gramercy Park - Murray Hill                       NaN
## Long Island City - Astoria-Gramercy Park - Murray Hill                    NaN
## Lower Manhattan-Gramercy Park - Murray Hill                               NaN
## Northeast Bronx-Gramercy Park - Murray Hill                               NaN
## Pelham - Throgs Neck-Gramercy Park - Murray Hill                          NaN
## Port Richmond-Gramercy Park - Murray Hill                                 NaN
## Ridgewood - Forest Hills-Gramercy Park - Murray Hill                      NaN
## Rockaways-Gramercy Park - Murray Hill                                     NaN
## South Beach - Tottenville-Gramercy Park - Murray Hill                     NaN
## Southeast Queens-Gramercy Park - Murray Hill                              NaN
## Southwest Queens-Gramercy Park - Murray Hill                              NaN
## Stapleton - St. George-Gramercy Park - Murray Hill                        NaN
## Sunset Park-Gramercy Park - Murray Hill                                   NaN
## Union Square - Lower East Side-Gramercy Park - Murray Hill                NaN
## Upper East Side-Gramercy Park - Murray Hill                               NaN
## Upper West Side-Gramercy Park - Murray Hill                               NaN
## Washington Heights-Gramercy Park - Murray Hill                            NaN
## West Queens-Gramercy Park - Murray Hill                                   NaN
## Williamsburg - Bushwick-Gramercy Park - Murray Hill                       NaN
## Willowbrook-Gramercy Park - Murray Hill                                   NaN
## Greenwich Village - SoHo-Greenpoint                                       NaN
## High Bridge - Morrisania-Greenpoint                                       NaN
## Hunts Point - Mott Haven-Greenpoint                                       NaN
## Jamaica-Greenpoint                                                        NaN
## Kingsbridge - Riverdale-Greenpoint                                        NaN
## Long Island City - Astoria-Greenpoint                                     NaN
## Lower Manhattan-Greenpoint                                                NaN
## Northeast Bronx-Greenpoint                                                NaN
## Pelham - Throgs Neck-Greenpoint                                           NaN
## Port Richmond-Greenpoint                                                  NaN
## Ridgewood - Forest Hills-Greenpoint                                       NaN
## Rockaways-Greenpoint                                                      NaN
## South Beach - Tottenville-Greenpoint                                      NaN
## Southeast Queens-Greenpoint                                               NaN
## Southwest Queens-Greenpoint                                               NaN
## Stapleton - St. George-Greenpoint                                         NaN
## Sunset Park-Greenpoint                                                    NaN
## Union Square - Lower East Side-Greenpoint                                 NaN
## Upper East Side-Greenpoint                                                NaN
## Upper West Side-Greenpoint                                                NaN
## Washington Heights-Greenpoint                                             NaN
## West Queens-Greenpoint                                                    NaN
## Williamsburg - Bushwick-Greenpoint                                        NaN
## Willowbrook-Greenpoint                                                    NaN
## High Bridge - Morrisania-Greenwich Village - SoHo                         NaN
## Hunts Point - Mott Haven-Greenwich Village - SoHo                         NaN
## Jamaica-Greenwich Village - SoHo                                          NaN
## Kingsbridge - Riverdale-Greenwich Village - SoHo                          NaN
## Long Island City - Astoria-Greenwich Village - SoHo                       NaN
## Lower Manhattan-Greenwich Village - SoHo                                  NaN
## Northeast Bronx-Greenwich Village - SoHo                                  NaN
## Pelham - Throgs Neck-Greenwich Village - SoHo                             NaN
## Port Richmond-Greenwich Village - SoHo                                    NaN
## Ridgewood - Forest Hills-Greenwich Village - SoHo                         NaN
## Rockaways-Greenwich Village - SoHo                                        NaN
## South Beach - Tottenville-Greenwich Village - SoHo                        NaN
## Southeast Queens-Greenwich Village - SoHo                                 NaN
## Southwest Queens-Greenwich Village - SoHo                                 NaN
## Stapleton - St. George-Greenwich Village - SoHo                           NaN
## Sunset Park-Greenwich Village - SoHo                                      NaN
## Union Square - Lower East Side-Greenwich Village - SoHo                   NaN
## Upper East Side-Greenwich Village - SoHo                                  NaN
## Upper West Side-Greenwich Village - SoHo                                  NaN
## Washington Heights-Greenwich Village - SoHo                               NaN
## West Queens-Greenwich Village - SoHo                                      NaN
## Williamsburg - Bushwick-Greenwich Village - SoHo                          NaN
## Willowbrook-Greenwich Village - SoHo                                      NaN
## Hunts Point - Mott Haven-High Bridge - Morrisania                         NaN
## Jamaica-High Bridge - Morrisania                                          NaN
## Kingsbridge - Riverdale-High Bridge - Morrisania                          NaN
## Long Island City - Astoria-High Bridge - Morrisania                       NaN
## Lower Manhattan-High Bridge - Morrisania                                  NaN
## Northeast Bronx-High Bridge - Morrisania                                  NaN
## Pelham - Throgs Neck-High Bridge - Morrisania                             NaN
## Port Richmond-High Bridge - Morrisania                                    NaN
## Ridgewood - Forest Hills-High Bridge - Morrisania                         NaN
## Rockaways-High Bridge - Morrisania                                        NaN
## South Beach - Tottenville-High Bridge - Morrisania                        NaN
## Southeast Queens-High Bridge - Morrisania                                 NaN
## Southwest Queens-High Bridge - Morrisania                                 NaN
## Stapleton - St. George-High Bridge - Morrisania                           NaN
## Sunset Park-High Bridge - Morrisania                                      NaN
## Union Square - Lower East Side-High Bridge - Morrisania                   NaN
## Upper East Side-High Bridge - Morrisania                                  NaN
## Upper West Side-High Bridge - Morrisania                                  NaN
## Washington Heights-High Bridge - Morrisania                               NaN
## West Queens-High Bridge - Morrisania                                      NaN
## Williamsburg - Bushwick-High Bridge - Morrisania                          NaN
## Willowbrook-High Bridge - Morrisania                                      NaN
## Jamaica-Hunts Point - Mott Haven                                          NaN
## Kingsbridge - Riverdale-Hunts Point - Mott Haven                          NaN
## Long Island City - Astoria-Hunts Point - Mott Haven                       NaN
## Lower Manhattan-Hunts Point - Mott Haven                                  NaN
## Northeast Bronx-Hunts Point - Mott Haven                                  NaN
## Pelham - Throgs Neck-Hunts Point - Mott Haven                             NaN
## Port Richmond-Hunts Point - Mott Haven                                    NaN
## Ridgewood - Forest Hills-Hunts Point - Mott Haven                         NaN
## Rockaways-Hunts Point - Mott Haven                                        NaN
## South Beach - Tottenville-Hunts Point - Mott Haven                        NaN
## Southeast Queens-Hunts Point - Mott Haven                                 NaN
## Southwest Queens-Hunts Point - Mott Haven                                 NaN
## Stapleton - St. George-Hunts Point - Mott Haven                           NaN
## Sunset Park-Hunts Point - Mott Haven                                      NaN
## Union Square - Lower East Side-Hunts Point - Mott Haven                   NaN
## Upper East Side-Hunts Point - Mott Haven                                  NaN
## Upper West Side-Hunts Point - Mott Haven                                  NaN
## Washington Heights-Hunts Point - Mott Haven                               NaN
## West Queens-Hunts Point - Mott Haven                                      NaN
## Williamsburg - Bushwick-Hunts Point - Mott Haven                          NaN
## Willowbrook-Hunts Point - Mott Haven                                      NaN
## Kingsbridge - Riverdale-Jamaica                                           NaN
## Long Island City - Astoria-Jamaica                                        NaN
## Lower Manhattan-Jamaica                                                   NaN
## Northeast Bronx-Jamaica                                                   NaN
## Pelham - Throgs Neck-Jamaica                                              NaN
## Port Richmond-Jamaica                                                     NaN
## Ridgewood - Forest Hills-Jamaica                                          NaN
## Rockaways-Jamaica                                                         NaN
## South Beach - Tottenville-Jamaica                                         NaN
## Southeast Queens-Jamaica                                                  NaN
## Southwest Queens-Jamaica                                                  NaN
## Stapleton - St. George-Jamaica                                            NaN
## Sunset Park-Jamaica                                                       NaN
## Union Square - Lower East Side-Jamaica                                    NaN
## Upper East Side-Jamaica                                                   NaN
## Upper West Side-Jamaica                                                   NaN
## Washington Heights-Jamaica                                                NaN
## West Queens-Jamaica                                                       NaN
## Williamsburg - Bushwick-Jamaica                                           NaN
## Willowbrook-Jamaica                                                       NaN
## Long Island City - Astoria-Kingsbridge - Riverdale                        NaN
## Lower Manhattan-Kingsbridge - Riverdale                                   NaN
## Northeast Bronx-Kingsbridge - Riverdale                                   NaN
## Pelham - Throgs Neck-Kingsbridge - Riverdale                              NaN
## Port Richmond-Kingsbridge - Riverdale                                     NaN
## Ridgewood - Forest Hills-Kingsbridge - Riverdale                          NaN
## Rockaways-Kingsbridge - Riverdale                                         NaN
## South Beach - Tottenville-Kingsbridge - Riverdale                         NaN
## Southeast Queens-Kingsbridge - Riverdale                                  NaN
## Southwest Queens-Kingsbridge - Riverdale                                  NaN
## Stapleton - St. George-Kingsbridge - Riverdale                            NaN
## Sunset Park-Kingsbridge - Riverdale                                       NaN
## Union Square - Lower East Side-Kingsbridge - Riverdale                    NaN
## Upper East Side-Kingsbridge - Riverdale                                   NaN
## Upper West Side-Kingsbridge - Riverdale                                   NaN
## Washington Heights-Kingsbridge - Riverdale                                NaN
## West Queens-Kingsbridge - Riverdale                                       NaN
## Williamsburg - Bushwick-Kingsbridge - Riverdale                           NaN
## Willowbrook-Kingsbridge - Riverdale                                       NaN
## Lower Manhattan-Long Island City - Astoria                                NaN
## Northeast Bronx-Long Island City - Astoria                                NaN
## Pelham - Throgs Neck-Long Island City - Astoria                           NaN
## Port Richmond-Long Island City - Astoria                                  NaN
## Ridgewood - Forest Hills-Long Island City - Astoria                       NaN
## Rockaways-Long Island City - Astoria                                      NaN
## South Beach - Tottenville-Long Island City - Astoria                      NaN
## Southeast Queens-Long Island City - Astoria                               NaN
## Southwest Queens-Long Island City - Astoria                               NaN
## Stapleton - St. George-Long Island City - Astoria                         NaN
## Sunset Park-Long Island City - Astoria                                    NaN
## Union Square - Lower East Side-Long Island City - Astoria                 NaN
## Upper East Side-Long Island City - Astoria                                NaN
## Upper West Side-Long Island City - Astoria                                NaN
## Washington Heights-Long Island City - Astoria                             NaN
## West Queens-Long Island City - Astoria                                    NaN
## Williamsburg - Bushwick-Long Island City - Astoria                        NaN
## Willowbrook-Long Island City - Astoria                                    NaN
## Northeast Bronx-Lower Manhattan                                           NaN
## Pelham - Throgs Neck-Lower Manhattan                                      NaN
## Port Richmond-Lower Manhattan                                             NaN
## Ridgewood - Forest Hills-Lower Manhattan                                  NaN
## Rockaways-Lower Manhattan                                                 NaN
## South Beach - Tottenville-Lower Manhattan                                 NaN
## Southeast Queens-Lower Manhattan                                          NaN
## Southwest Queens-Lower Manhattan                                          NaN
## Stapleton - St. George-Lower Manhattan                                    NaN
## Sunset Park-Lower Manhattan                                               NaN
## Union Square - Lower East Side-Lower Manhattan                            NaN
## Upper East Side-Lower Manhattan                                           NaN
## Upper West Side-Lower Manhattan                                           NaN
## Washington Heights-Lower Manhattan                                        NaN
## West Queens-Lower Manhattan                                               NaN
## Williamsburg - Bushwick-Lower Manhattan                                   NaN
## Willowbrook-Lower Manhattan                                               NaN
## Pelham - Throgs Neck-Northeast Bronx                                      NaN
## Port Richmond-Northeast Bronx                                             NaN
## Ridgewood - Forest Hills-Northeast Bronx                                  NaN
## Rockaways-Northeast Bronx                                                 NaN
## South Beach - Tottenville-Northeast Bronx                                 NaN
## Southeast Queens-Northeast Bronx                                          NaN
## Southwest Queens-Northeast Bronx                                          NaN
## Stapleton - St. George-Northeast Bronx                                    NaN
## Sunset Park-Northeast Bronx                                               NaN
## Union Square - Lower East Side-Northeast Bronx                            NaN
## Upper East Side-Northeast Bronx                                           NaN
## Upper West Side-Northeast Bronx                                           NaN
## Washington Heights-Northeast Bronx                                        NaN
## West Queens-Northeast Bronx                                               NaN
## Williamsburg - Bushwick-Northeast Bronx                                   NaN
## Willowbrook-Northeast Bronx                                               NaN
## Port Richmond-Pelham - Throgs Neck                                        NaN
## Ridgewood - Forest Hills-Pelham - Throgs Neck                             NaN
## Rockaways-Pelham - Throgs Neck                                            NaN
## South Beach - Tottenville-Pelham - Throgs Neck                            NaN
## Southeast Queens-Pelham - Throgs Neck                                     NaN
## Southwest Queens-Pelham - Throgs Neck                                     NaN
## Stapleton - St. George-Pelham - Throgs Neck                               NaN
## Sunset Park-Pelham - Throgs Neck                                          NaN
## Union Square - Lower East Side-Pelham - Throgs Neck                       NaN
## Upper East Side-Pelham - Throgs Neck                                      NaN
## Upper West Side-Pelham - Throgs Neck                                      NaN
## Washington Heights-Pelham - Throgs Neck                                   NaN
## West Queens-Pelham - Throgs Neck                                          NaN
## Williamsburg - Bushwick-Pelham - Throgs Neck                              NaN
## Willowbrook-Pelham - Throgs Neck                                          NaN
## Ridgewood - Forest Hills-Port Richmond                                    NaN
## Rockaways-Port Richmond                                                   NaN
## South Beach - Tottenville-Port Richmond                                   NaN
## Southeast Queens-Port Richmond                                            NaN
## Southwest Queens-Port Richmond                                            NaN
## Stapleton - St. George-Port Richmond                                      NaN
## Sunset Park-Port Richmond                                                 NaN
## Union Square - Lower East Side-Port Richmond                              NaN
## Upper East Side-Port Richmond                                             NaN
## Upper West Side-Port Richmond                                             NaN
## Washington Heights-Port Richmond                                          NaN
## West Queens-Port Richmond                                                 NaN
## Williamsburg - Bushwick-Port Richmond                                     NaN
## Willowbrook-Port Richmond                                                 NaN
## Rockaways-Ridgewood - Forest Hills                                        NaN
## South Beach - Tottenville-Ridgewood - Forest Hills                        NaN
## Southeast Queens-Ridgewood - Forest Hills                                 NaN
## Southwest Queens-Ridgewood - Forest Hills                                 NaN
## Stapleton - St. George-Ridgewood - Forest Hills                           NaN
## Sunset Park-Ridgewood - Forest Hills                                      NaN
## Union Square - Lower East Side-Ridgewood - Forest Hills                   NaN
## Upper East Side-Ridgewood - Forest Hills                                  NaN
## Upper West Side-Ridgewood - Forest Hills                                  NaN
## Washington Heights-Ridgewood - Forest Hills                               NaN
## West Queens-Ridgewood - Forest Hills                                      NaN
## Williamsburg - Bushwick-Ridgewood - Forest Hills                          NaN
## Willowbrook-Ridgewood - Forest Hills                                      NaN
## South Beach - Tottenville-Rockaways                                       NaN
## Southeast Queens-Rockaways                                                NaN
## Southwest Queens-Rockaways                                                NaN
## Stapleton - St. George-Rockaways                                          NaN
## Sunset Park-Rockaways                                                     NaN
## Union Square - Lower East Side-Rockaways                                  NaN
## Upper East Side-Rockaways                                                 NaN
## Upper West Side-Rockaways                                                 NaN
## Washington Heights-Rockaways                                              NaN
## West Queens-Rockaways                                                     NaN
## Williamsburg - Bushwick-Rockaways                                         NaN
## Willowbrook-Rockaways                                                     NaN
## Southeast Queens-South Beach - Tottenville                                NaN
## Southwest Queens-South Beach - Tottenville                                NaN
## Stapleton - St. George-South Beach - Tottenville                          NaN
## Sunset Park-South Beach - Tottenville                                     NaN
## Union Square - Lower East Side-South Beach - Tottenville                  NaN
## Upper East Side-South Beach - Tottenville                                 NaN
## Upper West Side-South Beach - Tottenville                                 NaN
## Washington Heights-South Beach - Tottenville                              NaN
## West Queens-South Beach - Tottenville                                     NaN
## Williamsburg - Bushwick-South Beach - Tottenville                         NaN
## Willowbrook-South Beach - Tottenville                                     NaN
## Southwest Queens-Southeast Queens                                         NaN
## Stapleton - St. George-Southeast Queens                                   NaN
## Sunset Park-Southeast Queens                                              NaN
## Union Square - Lower East Side-Southeast Queens                           NaN
## Upper East Side-Southeast Queens                                          NaN
## Upper West Side-Southeast Queens                                          NaN
## Washington Heights-Southeast Queens                                       NaN
## West Queens-Southeast Queens                                              NaN
## Williamsburg - Bushwick-Southeast Queens                                  NaN
## Willowbrook-Southeast Queens                                              NaN
## Stapleton - St. George-Southwest Queens                                   NaN
## Sunset Park-Southwest Queens                                              NaN
## Union Square - Lower East Side-Southwest Queens                           NaN
## Upper East Side-Southwest Queens                                          NaN
## Upper West Side-Southwest Queens                                          NaN
## Washington Heights-Southwest Queens                                       NaN
## West Queens-Southwest Queens                                              NaN
## Williamsburg - Bushwick-Southwest Queens                                  NaN
## Willowbrook-Southwest Queens                                              NaN
## Sunset Park-Stapleton - St. George                                        NaN
## Union Square - Lower East Side-Stapleton - St. George                     NaN
## Upper East Side-Stapleton - St. George                                    NaN
## Upper West Side-Stapleton - St. George                                    NaN
## Washington Heights-Stapleton - St. George                                 NaN
## West Queens-Stapleton - St. George                                        NaN
## Williamsburg - Bushwick-Stapleton - St. George                            NaN
## Willowbrook-Stapleton - St. George                                        NaN
## Union Square - Lower East Side-Sunset Park                                NaN
## Upper East Side-Sunset Park                                               NaN
## Upper West Side-Sunset Park                                               NaN
## Washington Heights-Sunset Park                                            NaN
## West Queens-Sunset Park                                                   NaN
## Williamsburg - Bushwick-Sunset Park                                       NaN
## Willowbrook-Sunset Park                                                   NaN
## Upper East Side-Union Square - Lower East Side                            NaN
## Upper West Side-Union Square - Lower East Side                            NaN
## Washington Heights-Union Square - Lower East Side                         NaN
## West Queens-Union Square - Lower East Side                                NaN
## Williamsburg - Bushwick-Union Square - Lower East Side                    NaN
## Willowbrook-Union Square - Lower East Side                                NaN
## Upper West Side-Upper East Side                                           NaN
## Washington Heights-Upper East Side                                        NaN
## West Queens-Upper East Side                                               NaN
## Williamsburg - Bushwick-Upper East Side                                   NaN
## Willowbrook-Upper East Side                                               NaN
## Washington Heights-Upper West Side                                        NaN
## West Queens-Upper West Side                                               NaN
## Williamsburg - Bushwick-Upper West Side                                   NaN
## Willowbrook-Upper West Side                                               NaN
## West Queens-Washington Heights                                            NaN
## Williamsburg - Bushwick-Washington Heights                                NaN
## Willowbrook-Washington Heights                                            NaN
## Williamsburg - Bushwick-West Queens                                       NaN
## Willowbrook-West Queens                                                   NaN
## Willowbrook-Williamsburg - Bushwick                                       NaN

The ANOVA shows significant differences in PM2.5 levels across UHF regions (Sum Sq = 26.36, Mean Sq = 0.6428). However, post-hoc Tukey tests couldn’t identify specific differences due to missing or invalid data, requiring further data cleaning for detailed insights.

Hierarchical Clustering of PM2.5 Levels

# data for clustering (PM2.5_Mean only)
data_for_clustering <- grouped_data %>%
  select(PM2.5_Mean) %>%
  scale()

# Determine optimal number of clusters
library(factoextra)
fviz_nbclust(data_for_clustering, kmeans, method = "wss") +
  labs(title = "Optimal Clusters using Elbow Method")

# Apply K-means clustering
set.seed(123)
kmeans_result <- kmeans(data_for_clustering, centers = 4)  # Adjust 'centers' based on elbow plot
grouped_data$Cluster <- as.factor(kmeans_result$cluster)

# Plot with improved label clarity
ggplot(grouped_data, aes(x = PM2.5_Mean, y = Cluster, color = Cluster)) +
  geom_point(size = 3, alpha = 0.7) +
  geom_text(
    aes(label = UHF_name),
    hjust = 0,         
    vjust = 1,         
    size = 3,          
    check_overlap = TRUE  
  ) +
  labs(
    title = "Clusters of PM2.5 Levels by UHF Region with Labels",
    x = "Scaled PM2.5 Mean Levels",
    y = "Cluster",
    color = "Cluster"
  ) +
  theme_minimal() +
  theme(
    legend.position = "bottom",  
    plot.title = element_text(size = 14, face = "bold"),  
    axis.text.x = element_text(angle = 45, hjust = 1)    
  )

Future Directions

Integrate Demographic Data: Incorporate demographic characteristics such as age distribution, socioeconomic status, and pre-existing health conditions for deeper insights. Expand to Other Pollutants: Analyze additional air quality indicators for a comprehensive understanding of air pollution in NYC and other cities Real-Time Monitoring: Leverage API data to explore temporal variations. Geospatial Analysis: Investigate spatial correlations using GIS tools to map health outcomes against pollution levels.

Conclusion

In conclusion, while this analysis may not be significant, it has been immensely useful for me in advancing my own understanding and skill set. Through this project, I gained hands-on experience with techniques like regression analysis, clustering, and ANOVA, as well as managing the challenges of data cleaning, integration, and visualization. Despite the weak statistical results, this process has deepened my ability to critically analyze data and interpret findings, which will be invaluable as I move forward in my studies and work. This project has given me a practical foundation to build upon and equipped me with the tools to tackle more complex data-driven challenges in the future.