Exercise USA

Sara Stoudt true
07-17-2018

Week 16

CDC

CDC - National Health Statistics Reports|

setwd("~/Desktop/tidytuesday/data/2018/2018-07-17")
exercise <- read_excel("week16_exercise.xlsx", sheet = 1)

exercise <- exercise[, -1] ## remove count
exercise <- exercise[-1, ] ## remove "all states""

exerciseT <- exercise %>% gather(type, value, -state)
exerciseT$value <- as.numeric(exerciseT$value)

You Better Work

I expected that working men and women would have less time to exercise, but it looks like those who work meet the federal guidelines for exercise more across the US.

Some potential reasons:

ggplot(subset(exerciseT, type %in% c("men_nonworking", "men_working", "women_nonworking", "women_working")), aes(x = type, y = value, fill = type)) +
  geom_bar(stat = "identity", position = position_dodge2(preserve = "total")) +
  facet_geo(~state) +
  theme(
    axis.title.x = element_blank(),
    axis.text.x = element_blank(),
    axis.ticks.x = element_blank()
  )

Where are the largest/smallest disparities?

In honor of the theme of sweating, I mean exercise, I’m switching to the inferno palette.

exercise[2:ncol(exercise)] <- apply(exercise[2:ncol(exercise)], 2, function(x) {
  as.numeric(x)
})

counties <- map_data("county")
state <- map_data("state")

exercise$state <- tolower(exercise$state)

all_state <- inner_join(state, exercise, by = c("region" = "state"))

What’s striking here is that there is only one negative value. Only in New Hampshire do women meet the guidelines more than men. In DC, the difference between genders is largest, while Montana has the smallest difference.

ggplot(data = state, mapping = aes(x = long, y = lat, group = group)) +
  geom_polygon(data = all_state, aes(fill = men - women), color = "grey") +
  labs(fill = "men - women") +
  scale_fill_viridis(option = "inferno") +
  theme_void() +
  geom_path(data = state, aes(x = long, y = lat, group = group), color = "black") +
  ggtitle("Battle of the Sexes")
exercise$state[which(exercise$men - exercise$women < 0)]
[1] "new hampshire"
exercise$state[which.max(abs(exercise$men - exercise$women))]
[1] "district of columbia"
exercise$state[which.min(abs(exercise$men - exercise$women))]
[1] "montana"

In South Dakota and Nebraska nonworking men meet the guidelines more than working men. Vermont has the biggest disparity while Iowa has the smallest.

ggplot(data = state, mapping = aes(x = long, y = lat, group = group)) +
  geom_polygon(data = all_state, aes(fill = men_working - men_nonworking), color = "grey") +
  labs(fill = "menWork-menNonwork") +
  scale_fill_viridis(option = "inferno") +
  theme_void() +
  geom_path(data = state, aes(x = long, y = lat, group = group), color = "black") +
  ggtitle("Working(?) Men")
exercise$state[which.max(abs(exercise$men_working - exercise$men_nonworking))]
[1] "vermont"
exercise$state[which.min(abs(exercise$men_working - exercise$men_nonworking))]
[1] "iowa"

In Idaho and Utah nonworking women meet the guidelines more than working women. Wyoming has the biggest disparity while Oklahoma has the smallest.

ggplot(data = state, mapping = aes(x = long, y = lat, group = group)) +
  geom_polygon(data = all_state, aes(fill = women_working - women_nonworking), color = "grey") +
  labs(fill = "womenWork-womenNonwork") +
  scale_fill_viridis(option = "inferno") +
  theme_void() +
  geom_path(data = state, aes(x = long, y = lat, group = group), color = "black") +
  ggtitle("Working(?) Women")
exercise$state[which(exercise$women_working - exercise$women_nonworking < 0)]
[1] "idaho" "utah" 
exercise$state[which.max(abs(exercise$women_working - exercise$women_nonworking))]
[1] "wyoming"
exercise$state[which.min(abs(exercise$women_working - exercise$women_nonworking))]
[1] "oklahoma"