## Fuel Graph:
mpg %>%
  ggplot(aes(x = fl)) +
  geom_bar() +
  labs(title = "Count of Vehicles by Fuel Type",
       x = "Fuel type", y = "Count")

  1. The fuel type that is most common is r, Regular Petrol
mpg %>%
  ggplot(aes(x = fl, y = hwy)) +
  geom_boxplot() +
  labs(title = "Highway MPG by Fuel Type",
       x = "Fuel (d=diesel, p=premium, r=regular)", y = "Highway MPG")

  1. Yes, better fuel, better efficency
mpg %>%
  ggplot(aes(x = as.factor(year), y = hwy)) +
  geom_boxplot() +
  labs(title = "Highway MPG: 1999 vs 2008",
       x = "Year", y = "Highway MPG")

  1. Fuel efficeny increased slightly as a whole since 1999, but the median went down
mpg %>%
  ggplot(aes(x = class, y = drv)) +
  geom_point(position = position_jitter(width = 0.2, height = 0.2), alpha = 0.6) +
  labs(title = "Scatter of class vs drv (jittered)",
       x = "Vehicle class", y = "Drive type")

  1. Not really, the points stack and overlap with each, especially if there are only two categorical variables.