Two-bedroom stats, by rent category
Rent_Category Count Minimum Average Maximum
Above average 5 1630 1750 1920
Below average 7 1270 1376 1490
# Grouping and summarizing

Summary_BR2 <- FMR_RuCo %>% 
  group_by(Rent_Category) %>% 
  summarize(Count = n(),
            Minimum = min(BR2),
            Average = round(mean(BR2), 0),
            Maximum = max(BR2))

# Making the table

Summary_BR2_table <- gt(Summary_BR2) %>% 
  tab_header("Two-bedroom stats, by rent category") %>%
  cols_align(align = "left") %>%
  gt_theme_538

# Showing the table

Summary_BR2_table