##Boston, MA
cd_demo_race_bos_all <- cd_demo_race %>% filter(Value > 100, Place =="Boston, MA")
cd_demo_race_bos_all
## # A tibble: 5 x 7
## `Indicator Category` Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Peo… 2012 Both All 637516 Boston, …
## 2 Demographics Total Population (Peo… 2013 Both All 644710 Boston, …
## 3 Demographics Total Population (Peo… 2014 Both All 656051 Boston, …
## 4 Demographics Total Population (Peo… 2015 Both All 669469 Boston, …
## 5 Demographics Total Population (Peo… 2016 Both All 672840 Boston, …
ggplot(data = cd_demo_race_bos_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Boston, MA - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_minimal()
#lbls = c ("2012", "2013", "2014", "2015", "2016")
#pie(cd_demo_race_bos_all$Value, labels = lbls, main="Pie Chart for Year" )
#ggplot(data = cd_demo_race_bos_all) +
# geom_bar(mapping = aes(x=Value))
ggplot(data = cd_demo_race_bos_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 6)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Boston, MA - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_bos <- cd_demo_race %>% filter(Value < 100, Place =="Boston, MA")
cd_demo_race_bos
## # A tibble: 28 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American India… 0.1 Boston…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 9.1 Boston…
## 3 Demographics Race/Ethnicity … 2012 Both Black 23.3 Boston…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 18.6 Boston…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 2 Boston…
## 6 Demographics Race/Ethnicity … 2012 Both White 46 Boston…
## 7 Demographics Race/Ethnicity … 2013 Both American India… 0.3 Boston…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 8.9 Boston…
## 9 Demographics Race/Ethnicity … 2013 Both Black 22 Boston…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 18.8 Boston…
## # … with 18 more rows
ggplot(data = cd_demo_race_bos) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Boston, MA - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") + theme_light()
#Baltimore
cd_demo_race_bal_all <- cd_demo_race %>% filter(Value > 100, Place =="Baltimore, MD")
cd_demo_race_bal_all
## # A tibble: 5 x 7
## `Indicator Categor… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Pe… 2012 Both All 621342 Baltimore,…
## 2 Demographics Total Population (Pe… 2013 Both All 622104 Baltimore,…
## 3 Demographics Total Population (Pe… 2014 Both All 622793 Baltimore,…
## 4 Demographics Total Population (Pe… 2015 Both All 621849 Baltimore,…
## 5 Demographics Total Population (Pe… 2016 Both All 614664 Baltimore,…
ggplot(data = cd_demo_race_bal_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Baltimore, MD - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_bal <- cd_demo_race %>% filter(Value < 100, Place =="Baltimore, MD")
cd_demo_race_bal
## # A tibble: 27 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American Indi… 0.2 Baltimo…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 2.5 Baltimo…
## 3 Demographics Race/Ethnicity … 2012 Both Black 62.7 Baltimo…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 4.4 Baltimo…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 1.7 Baltimo…
## 6 Demographics Race/Ethnicity … 2012 Both White 28.1 Baltimo…
## 7 Demographics Race/Ethnicity … 2013 Both American Indi… 0.3 Baltimo…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 2.4 Baltimo…
## 9 Demographics Race/Ethnicity … 2013 Both Black 62.5 Baltimo…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 4.6 Baltimo…
## # … with 17 more rows
ggplot(data = cd_demo_race_bal) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Baltimore, MD - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Chicago, IL
cd_demo_race_chi_all <- cd_demo_race %>% filter(Value > 100, Place =="Chicago, Il")
cd_demo_race_chi_all
## # A tibble: 5 x 7
## `Indicator Category` Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Peo… 2012 Both All 2.71e6 Chicago,…
## 2 Demographics Total Population (Peo… 2013 Both All 2.72e6 Chicago,…
## 3 Demographics Total Population (Peo… 2014 Both All 2.72e6 Chicago,…
## 4 Demographics Total Population (Peo… 2015 Both All 2.72e6 Chicago,…
## 5 Demographics Total Population (Peo… 2016 Both All 2.70e6 Chicago,…
ggplot(data = cd_demo_race_chi_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Chicago, IL - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_chi <- cd_demo_race %>% filter(Value < 100, Place =="Chicago, Il")
cd_demo_race_chi
## # A tibble: 28 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American India… 0.1 Chicag…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 5.9 Chicag…
## 3 Demographics Race/Ethnicity … 2012 Both Black 31.5 Chicag…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 29 Chicag…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 1.4 Chicag…
## 6 Demographics Race/Ethnicity … 2012 Both White 31.8 Chicag…
## 7 Demographics Race/Ethnicity … 2013 Both American India… 0.1 Chicag…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 6 Chicag…
## 9 Demographics Race/Ethnicity … 2013 Both Black 31.4 Chicag…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 28.8 Chicag…
## # … with 18 more rows
ggplot(data = cd_demo_race_bal) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Chicago, IL - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") + theme_light()
#Cleveland, OH
cd_demo_race_cle_all <- cd_demo_race %>% filter(Value > 100, Place =="Cleveland, OH")
cd_demo_race_cle_all
## # A tibble: 5 x 7
## `Indicator Categor… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Pe… 2012 Both All 390923 Cleveland,…
## 2 Demographics Total Population (Pe… 2013 Both All 390106 Cleveland,…
## 3 Demographics Total Population (Pe… 2014 Both All 389524 Cleveland,…
## 4 Demographics Total Population (Pe… 2015 Both All 388059 Cleveland,…
## 5 Demographics Total Population (Pe… 2016 Both All 385810 Cleveland,…
ggplot(data = cd_demo_race_cle_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Cleveland, OH - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_cle <- cd_demo_race %>% filter(Value < 100, Place =="Cleveland, OH")
cd_demo_race_cle
## # A tibble: 29 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American Indi… 0.3 Clevela…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 1.9 Clevela…
## 3 Demographics Race/Ethnicity … 2012 Both Black 52.8 Clevela…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 10.7 Clevela…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 2 Clevela…
## 6 Demographics Race/Ethnicity … 2012 Both White 32.3 Clevela…
## 7 Demographics Race/Ethnicity … 2013 Both American Indi… 0.2 Clevela…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 1.4 Clevela…
## 9 Demographics Race/Ethnicity … 2013 Both Black 51.2 Clevela…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 10.8 Clevela…
## # … with 19 more rows
ggplot(data = cd_demo_race_cle) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Cleveland, OH - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Dallas, TX
cd_demo_race_dal_all <- cd_demo_race %>% filter(Value > 100, Place =="Dallas, TX")
cd_demo_race_dal_all
## # A tibble: 5 x 7
## `Indicator Category` Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Peo… 2012 Both All 2.45e6 Dallas, …
## 2 Demographics Total Population (Peo… 2013 Both All 2.48e6 Dallas, …
## 3 Demographics Total Population (Peo… 2014 Both All 2.52e6 Dallas, …
## 4 Demographics Total Population (Peo… 2015 Both All 2.55e6 Dallas, …
## 5 Demographics Total Population (Peo… 2016 Both All 2.57e6 Dallas, …
ggplot(data = cd_demo_race_dal_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 6)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Dallas, TX - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_dal <- cd_demo_race %>% filter(Value < 100, Place =="Dallas, TX")
cd_demo_race_dal
## # A tibble: 28 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American India… 0.2 Dallas…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 5.3 Dallas…
## 3 Demographics Race/Ethnicity … 2012 Both Black 22 Dallas…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 38.9 Dallas…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 1.4 Dallas…
## 6 Demographics Race/Ethnicity … 2012 Both White 32.1 Dallas…
## 7 Demographics Race/Ethnicity … 2013 Both American India… 0.2 Dallas…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 5.5 Dallas…
## 9 Demographics Race/Ethnicity … 2013 Both Black 21.8 Dallas…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 39 Dallas…
## # … with 18 more rows
ggplot(data = cd_demo_race_dal) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Dallas, TX - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Denver, CO
cd_demo_race_den_all <- cd_demo_race %>% filter(Value > 100, Place =="Denver, CO")
cd_demo_race_den_all
## # A tibble: 5 x 7
## `Indicator Category` Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Peo… 2012 Both All 634265 Denver, …
## 2 Demographics Total Population (Peo… 2013 Both All 649495 Denver, …
## 3 Demographics Total Population (Peo… 2014 Both All 663862 Denver, …
## 4 Demographics Total Population (Peo… 2015 Both All 682545 Denver, …
## 5 Demographics Total Population (Peo… 2016 Both All 693060 Denver, …
ggplot(data = cd_demo_race_den_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Denver, CO - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_den <- cd_demo_race %>% filter(Value < 100, Place =="Denver, CO")
cd_demo_race_den
## # A tibble: 30 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American India… 0.5 Denver…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 3.2 Denver…
## 3 Demographics Race/Ethnicity … 2012 Both Black 9.8 Denver…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 31.5 Denver…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 2.1 Denver…
## 6 Demographics Race/Ethnicity … 2012 Both White 52.6 Denver…
## 7 Demographics Race/Ethnicity … 2013 Both American India… 0.5 Denver…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 3.2 Denver…
## 9 Demographics Race/Ethnicity … 2013 Both Black 9.4 Denver…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 30.9 Denver…
## # … with 20 more rows
ggplot(data = cd_demo_race_den) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Denver, CO - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Detroit, MI
cd_demo_race_det_all <- cd_demo_race %>% filter(Value > 100, Place =="Detroit, MI")
cd_demo_race_det_all
## # A tibble: 5 x 7
## `Indicator Category` Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Peo… 2012 Both All 701524 Detroit,…
## 2 Demographics Total Population (Peo… 2013 Both All 688740 Detroit,…
## 3 Demographics Total Population (Peo… 2014 Both All 680281 Detroit,…
## 4 Demographics Total Population (Peo… 2015 Both All 677124 Detroit,…
## 5 Demographics Total Population (Peo… 2016 Both All 672829 Detroit,…
ggplot(data = cd_demo_race_det_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Detroit, MI - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_det <- cd_demo_race %>% filter(Value < 100, Place =="Detroit, MI")
cd_demo_race_det
## # A tibble: 28 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American India… 0.3 Detroi…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 1.1 Detroi…
## 3 Demographics Race/Ethnicity … 2012 Both Black 81.4 Detroi…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 7.5 Detroi…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 1.6 Detroi…
## 6 Demographics Race/Ethnicity … 2012 Both White 8.2 Detroi…
## 7 Demographics Race/Ethnicity … 2013 Both American India… 0.3 Detroi…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 1.3 Detroi…
## 9 Demographics Race/Ethnicity … 2013 Both Black 80.1 Detroi…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 7.7 Detroi…
## # … with 18 more rows
ggplot(data = cd_demo_race_det) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Detroit, MI - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Fort Worth (Tarrant County), TX
cd_demo_race_ftw_all <- cd_demo_race %>% filter(Value > 100, Place =="Fort Worth (Tarrant County), TX")
cd_demo_race_ftw_all
## # A tibble: 5 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population… 2012 Both All 1.88e6 Fort Worth (Tar…
## 2 Demographics Total Population… 2013 Both All 1.91e6 Fort Worth (Tar…
## 3 Demographics Total Population… 2014 Both All 1.95e6 Fort Worth (Tar…
## 4 Demographics Total Population… 2015 Both All 1.98e6 Fort Worth (Tar…
## 5 Demographics Total Population… 2016 Both All 2.02e6 Fort Worth (Tar…
ggplot(data = cd_demo_race_ftw_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Fort Worth (Tarrant County), TX - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_ftw <- cd_demo_race %>% filter(Value < 100, Place =="Fort Worth (Tarrant County), TX")
cd_demo_race_ftw
## # A tibble: 29 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicit… 2012 Both American In… 0.3 Fort Worth …
## 2 Demographics Race/Ethnicit… 2012 Both Asian/PI 4.8 Fort Worth …
## 3 Demographics Race/Ethnicit… 2012 Both Black 15 Fort Worth …
## 4 Demographics Race/Ethnicit… 2012 Both Hispanic 27.4 Fort Worth …
## 5 Demographics Race/Ethnicit… 2012 Both Multiracial 1.8 Fort Worth …
## 6 Demographics Race/Ethnicit… 2012 Both White 50.5 Fort Worth …
## 7 Demographics Race/Ethnicit… 2013 Both American In… 0.3 Fort Worth …
## 8 Demographics Race/Ethnicit… 2013 Both Asian/PI 4.6 Fort Worth …
## 9 Demographics Race/Ethnicit… 2013 Both Black 14.9 Fort Worth …
## 10 Demographics Race/Ethnicit… 2013 Both Hispanic 27.6 Fort Worth …
## # … with 19 more rows
ggplot(data = cd_demo_race_ftw) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Fort Worth (Tarrant County), TX - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Houston, TX
cd_demo_race_hou_all <- cd_demo_race %>% filter(Value > 100, Place =="Houston, TX")
cd_demo_race_hou_all
## # A tibble: 5 x 7
## `Indicator Category` Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Peo… 2012 Both All 2.16e6 Houston,…
## 2 Demographics Total Population (Peo… 2013 Both All 2.20e6 Houston,…
## 3 Demographics Total Population (Peo… 2014 Both All 2.24e6 Houston,…
## 4 Demographics Total Population (Peo… 2015 Both All 2.30e6 Houston,…
## 5 Demographics Total Population (Peo… 2016 Both All 2.30e6 Houston,…
ggplot(data = cd_demo_race_hou_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Houston, TX - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_hou <- cd_demo_race %>% filter(Value < 100, Place =="Fort Worth (Tarrant County), TX")
cd_demo_race_hou
## # A tibble: 29 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicit… 2012 Both American In… 0.3 Fort Worth …
## 2 Demographics Race/Ethnicit… 2012 Both Asian/PI 4.8 Fort Worth …
## 3 Demographics Race/Ethnicit… 2012 Both Black 15 Fort Worth …
## 4 Demographics Race/Ethnicit… 2012 Both Hispanic 27.4 Fort Worth …
## 5 Demographics Race/Ethnicit… 2012 Both Multiracial 1.8 Fort Worth …
## 6 Demographics Race/Ethnicit… 2012 Both White 50.5 Fort Worth …
## 7 Demographics Race/Ethnicit… 2013 Both American In… 0.3 Fort Worth …
## 8 Demographics Race/Ethnicit… 2013 Both Asian/PI 4.6 Fort Worth …
## 9 Demographics Race/Ethnicit… 2013 Both Black 14.9 Fort Worth …
## 10 Demographics Race/Ethnicit… 2013 Both Hispanic 27.6 Fort Worth …
## # … with 19 more rows
ggplot(data = cd_demo_race_hou) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Houston, TX - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Houston, TX
cd_demo_race_hou_all <- cd_demo_race %>% filter(Value > 100, Place =="Houston, TX")
cd_demo_race_hou_all
## # A tibble: 5 x 7
## `Indicator Category` Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Peo… 2012 Both All 2.16e6 Houston,…
## 2 Demographics Total Population (Peo… 2013 Both All 2.20e6 Houston,…
## 3 Demographics Total Population (Peo… 2014 Both All 2.24e6 Houston,…
## 4 Demographics Total Population (Peo… 2015 Both All 2.30e6 Houston,…
## 5 Demographics Total Population (Peo… 2016 Both All 2.30e6 Houston,…
ggplot(data = cd_demo_race_hou_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Houston, TX - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_hou <- cd_demo_race %>% filter(Value < 100, Place =="Fort Worth (Tarrant County), TX")
cd_demo_race_hou
## # A tibble: 29 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicit… 2012 Both American In… 0.3 Fort Worth …
## 2 Demographics Race/Ethnicit… 2012 Both Asian/PI 4.8 Fort Worth …
## 3 Demographics Race/Ethnicit… 2012 Both Black 15 Fort Worth …
## 4 Demographics Race/Ethnicit… 2012 Both Hispanic 27.4 Fort Worth …
## 5 Demographics Race/Ethnicit… 2012 Both Multiracial 1.8 Fort Worth …
## 6 Demographics Race/Ethnicit… 2012 Both White 50.5 Fort Worth …
## 7 Demographics Race/Ethnicit… 2013 Both American In… 0.3 Fort Worth …
## 8 Demographics Race/Ethnicit… 2013 Both Asian/PI 4.6 Fort Worth …
## 9 Demographics Race/Ethnicit… 2013 Both Black 14.9 Fort Worth …
## 10 Demographics Race/Ethnicit… 2013 Both Hispanic 27.6 Fort Worth …
## # … with 19 more rows
ggplot(data = cd_demo_race_hou) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Houston, TX - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Kansas City, MO
cd_demo_race_kcmo_all <- cd_demo_race %>% filter(Value > 100, Place =="Kansas City, MO")
cd_demo_race_kcmo_all
## # A tibble: 5 x 7
## `Indicator Categor… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (P… 2012 Both All 464346 Kansas City…
## 2 Demographics Total Population (P… 2013 Both All 467082 Kansas City…
## 3 Demographics Total Population (P… 2014 Both All 470816 Kansas City…
## 4 Demographics Total Population (P… 2015 Both All 475361 Kansas City…
## 5 Demographics Total Population (P… 2016 Both All 481360 Kansas City…
ggplot(data = cd_demo_race_kcmo_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Kansas City, MO - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_kcmo <- cd_demo_race %>% filter(Value < 100, Place =="Kansas City, MO")
cd_demo_race_kcmo
## # A tibble: 28 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity… 2012 Both American India… 0.5 Kansas …
## 2 Demographics Race/Ethnicity… 2012 Both Asian/PI 2.3 Kansas …
## 3 Demographics Race/Ethnicity… 2012 Both Black 30 Kansas …
## 4 Demographics Race/Ethnicity… 2012 Both Hispanic 10 Kansas …
## 5 Demographics Race/Ethnicity… 2012 Both Multiracial 2.5 Kansas …
## 6 Demographics Race/Ethnicity… 2012 Both White 54.4 Kansas …
## 7 Demographics Race/Ethnicity… 2013 Both American India… 0.3 Kansas …
## 8 Demographics Race/Ethnicity… 2013 Both Asian/PI 2.6 Kansas …
## 9 Demographics Race/Ethnicity… 2013 Both Black 27.8 Kansas …
## 10 Demographics Race/Ethnicity… 2013 Both Hispanic 10.4 Kansas …
## # … with 18 more rows
ggplot(data = cd_demo_race_kcmo) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Kansas City, MO - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Las Vegas (Clark County), NV
cd_demo_race_lv_all <- cd_demo_race %>% filter(Value > 100, Place =="Las Vegas (Clark County), NV")
cd_demo_race_lv_all
## # A tibble: 5 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population… 2012 Both All 2000759 Las Vegas (Cla…
## 2 Demographics Total Population… 2013 Both All 2027868 Las Vegas (Cla…
## 3 Demographics Total Population… 2014 Both All 2069681 Las Vegas (Cla…
## 4 Demographics Total Population… 2015 Both All 2114801 Las Vegas (Cla…
## 5 Demographics Total Population… 2016 Both All 2155664 Las Vegas (Cla…
ggplot(data = cd_demo_race_lv_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Las Vegas (Clark County), NV - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_lv <- cd_demo_race %>% filter(Value < 100, Place =="Las Vegas (Clark County), NV")
cd_demo_race_lv
## # A tibble: 30 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicit… 2012 Both American In… 0.4 Las Vegas (…
## 2 Demographics Race/Ethnicit… 2012 Both Asian/PI 8.8 Las Vegas (…
## 3 Demographics Race/Ethnicit… 2012 Both Black 10.3 Las Vegas (…
## 4 Demographics Race/Ethnicit… 2012 Both Hispanic 29.8 Las Vegas (…
## 5 Demographics Race/Ethnicit… 2012 Both Multiracial 3.2 Las Vegas (…
## 6 Demographics Race/Ethnicit… 2012 Both White 46.6 Las Vegas (…
## 7 Demographics Race/Ethnicit… 2013 Both American In… 0.4 Las Vegas (…
## 8 Demographics Race/Ethnicit… 2013 Both Asian/PI 9.1 Las Vegas (…
## 9 Demographics Race/Ethnicit… 2013 Both Black 10.4 Las Vegas (…
## 10 Demographics Race/Ethnicit… 2013 Both Hispanic 30 Las Vegas (…
## # … with 20 more rows
ggplot(data = cd_demo_race_lv) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Las Vegas (Clark County), NV - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Long Beach, CA
cd_demo_race_lbca_all <- cd_demo_race %>% filter(Value > 100, Place =="Long Beach, CA")
cd_demo_race_lbca_all
## # A tibble: 5 x 7
## `Indicator Categor… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (Pe… 2012 Both All 467888 Long Beach…
## 2 Demographics Total Population (Pe… 2013 Both All 469384 Long Beach…
## 3 Demographics Total Population (Pe… 2014 Both All 473605 Long Beach…
## 4 Demographics Total Population (Pe… 2015 Both All 474172 Long Beach…
## 5 Demographics Total Population (Pe… 2016 Both All 470140 Long Beach…
ggplot(data = cd_demo_race_lbca_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Long Beach, CA - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_lbca <- cd_demo_race %>% filter(Value < 100, Place =="Long Beach, CA")
cd_demo_race_lbca
## # A tibble: 30 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity … 2012 Both American Indi… 0.4 Long Be…
## 2 Demographics Race/Ethnicity … 2012 Both Asian/PI 11.8 Long Be…
## 3 Demographics Race/Ethnicity … 2012 Both Black 12.8 Long Be…
## 4 Demographics Race/Ethnicity … 2012 Both Hispanic 41.8 Long Be…
## 5 Demographics Race/Ethnicity … 2012 Both Multiracial 4.2 Long Be…
## 6 Demographics Race/Ethnicity … 2012 Both White 28.2 Long Be…
## 7 Demographics Race/Ethnicity … 2013 Both American Indi… 0.2 Long Be…
## 8 Demographics Race/Ethnicity … 2013 Both Asian/PI 12.4 Long Be…
## 9 Demographics Race/Ethnicity … 2013 Both Black 12.9 Long Be…
## 10 Demographics Race/Ethnicity … 2013 Both Hispanic 42.1 Long Be…
## # … with 20 more rows
ggplot(data = cd_demo_race_lbca) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Long Beach, CA - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Los Angeles, CA
cd_demo_race_laca_all <- cd_demo_race %>% filter(Value > 100, Place =="Los Angeles, CA")
cd_demo_race_laca_all
## # A tibble: 5 x 7
## `Indicator Categor… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population (P… 2012 Both All 3857786 Los Angele…
## 2 Demographics Total Population (P… 2013 Both All 3884340 Los Angele…
## 3 Demographics Total Population (P… 2014 Both All 3928827 Los Angele…
## 4 Demographics Total Population (P… 2015 Both All 3971896 Los Angele…
## 5 Demographics Total Population (P… 2016 Both All 3976324 Los Angele…
ggplot(data = cd_demo_race_laca_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Los Angeles, CA - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") +
theme_light()
cd_demo_race_laca <- cd_demo_race %>% filter(Value < 100, Place =="Los Angeles, CA")
cd_demo_race_laca
## # A tibble: 30 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicity… 2012 Both American India… 0.2 Los Ang…
## 2 Demographics Race/Ethnicity… 2012 Both Asian/PI 11.3 Los Ang…
## 3 Demographics Race/Ethnicity… 2012 Both Black 9 Los Ang…
## 4 Demographics Race/Ethnicity… 2012 Both Hispanic 48.4 Los Ang…
## 5 Demographics Race/Ethnicity… 2012 Both Multiracial 2.2 Los Ang…
## 6 Demographics Race/Ethnicity… 2012 Both White 28.4 Los Ang…
## 7 Demographics Race/Ethnicity… 2013 Both American India… 0.1 Los Ang…
## 8 Demographics Race/Ethnicity… 2013 Both Asian/PI 11.2 Los Ang…
## 9 Demographics Race/Ethnicity… 2013 Both Black 8.6 Los Ang…
## 10 Demographics Race/Ethnicity… 2013 Both Hispanic 49.3 Los Ang…
## # … with 20 more rows
ggplot(data = cd_demo_race_laca) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Los Angeles, CA - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
#Miami (Miami-Dade County), FL
cd_demo_race_mia_all <- cd_demo_race %>% filter(Value > 100, Place =="Miami (Miami-Dade County), FL")
cd_demo_race_mia_all
## # A tibble: 5 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Total Population… 2012 Both All 2.59e6 Miami (Miami-Da…
## 2 Demographics Total Population… 2013 Both All 2.62e6 Miami (Miami-Da…
## 3 Demographics Total Population… 2014 Both All 2.66e6 Miami (Miami-Da…
## 4 Demographics Total Population… 2015 Both All 2.69e6 Miami (Miami-Da…
## 5 Demographics Total Population… 2016 Both All 2.71e6 Miami (Miami-Da…
ggplot(data = cd_demo_race_mia_all) +
geom_point (mapping = aes(x= Year, y = Value, color = Year, shape = Year, size = 4)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Miami (Miami-Dade County), FL - Total Population", x = "Year", y = "Total Population", caption = "Data includes 2012-2016") + theme_light()
cd_demo_race_mia <- cd_demo_race %>% filter(Value < 100, Place =="Miami (Miami-Dade County), FL")
cd_demo_race_mia
## # A tibble: 28 x 7
## `Indicator Catego… Indicator Year Sex Race Value Place
## <chr> <chr> <fct> <chr> <chr> <dbl> <chr>
## 1 Demographics Race/Ethnicit… 2012 Both American In… 0.1 Miami (Miam…
## 2 Demographics Race/Ethnicit… 2012 Both Asian/PI 1.5 Miami (Miam…
## 3 Demographics Race/Ethnicit… 2012 Both Black 17.1 Miami (Miam…
## 4 Demographics Race/Ethnicit… 2012 Both Hispanic 64.3 Miami (Miam…
## 5 Demographics Race/Ethnicit… 2012 Both Multiracial 0.6 Miami (Miam…
## 6 Demographics Race/Ethnicit… 2012 Both White 16.1 Miami (Miam…
## 7 Demographics Race/Ethnicit… 2013 Both American In… 0.1 Miami (Miam…
## 8 Demographics Race/Ethnicit… 2013 Both Asian/PI 1.6 Miami (Miam…
## 9 Demographics Race/Ethnicit… 2013 Both Black 16.8 Miami (Miam…
## 10 Demographics Race/Ethnicit… 2013 Both Hispanic 65.6 Miami (Miam…
## # … with 18 more rows
ggplot(data = cd_demo_race_mia) +
geom_point (mapping = aes(x= Year, y = Value, color = Race, shape = Year)) +
facet_wrap(facets = vars(Race)) +
labs(title = "Demographics - Miami (Miami-Dade County), FL - Race / Ethnicity (Percent)", x = "Year", y = "Race / Ethnicity (Percent)", caption = "Data includes 2012-2016") +
theme_light()
You can also embed plots, for example:
Note that the echo = FALSE
parameter was added to the code chunk to prevent printing of the R code that generated the plot.