The Languages of New York City
ggplot(nyclang) +
geom_bar(aes(x = Language.Family, fill = Size)) +
theme(axis.text.x = element_text(angle = 90, hjust = 1)) +
scale_y_continuous(breaks = seq(0, 600, by=100), limits=c(0,600))
Above, the number of speaker communities for each language family. The fill color represents the size of the communities. Clearly, the language family with the largest representation is Indo-European.
ggplot(turktrue) +
geom_bar(aes(x = Language, fill = Size)) +
theme(axis.text.x = element_text(angle = 90, hjust = 1))
Above is a similar chart as the previous, but instead of language families, we are looking at the count of speaker communities of each Turkic language in the NYC area. Most communities are of the “smallest” size. Turkish, at 4, has the most communities, however these are medium and small in size. Uzbek is the sole Turkic language with a “large” community.
turkmap_view <- turktrue %>%
st_as_sf(coords = c("lon", "lat"), crs = 4326) %>%
st_jitter(factor = 0.01) %>%
mapview
turkmap_view
Here is an interactive map of each Turkic language. Clicking on a circle, which each represents one community, provides you with the available data about the community and its language.
ggplot(turktrue) +
geom_bar(aes(x = Location)) +
theme(axis.text.x = element_text(angle = 90, hjust = 1))
Most of the circles are clustered around , while the rest are dispersed around the rest of the city and New Jersey. Is there a pattern as to which languages are clustered near each other.
qmplot(x = lon, y = lat, data = turktrue, maptype = "stamen_toner_lite",
geom = "jitter", color = World.Region, size = .1, position = position_jitter(width = 10, height = .5))
## Warning: `position` is deprecated.
## ℹ Using `zoom = 10`
## ℹ © Stadia Maps © Stamen Design © OpenMapTiles © OpenStreetMap contributors.
qmplot(x = lon, y = lat, data = turktrue, maptype = "stamen_toner_lite",
geom = "jitter", color = Branch, size = .01, position = position_jitter(width = 15, height = .5)) +
labs(title = "yerrr")
## Warning: `position` is deprecated.
## ℹ Using `zoom = 10`
## ℹ © Stadia Maps © Stamen Design © OpenMapTiles © OpenStreetMap contributors.