This report looks to explore the unique American names of the Silent Generation, defined as the period from 1928 - 1945:

Wikipedia Page on The Silent Generation

Using a data set of baby names from the US Social Security Administration that ranges from 1880 - 2017, I aim to examine how popular the most popular names of the Silent generation were over the entire time span of the data.

When you click the Knit button a document will be generated that includes both content as well as the output of any embedded R code chunks within the document. You can embed an R code chunk like this:

mean(c(4,23,543))
## [1] 190

Load Required Packages

library(tidyverse)
library(babynames)

First, I’ll limit the data set to only the period of the Silent Generation:

babynames %>% 
  filter(year > 1927 & year < 1946 ) -> sg

Limiting the data to only females and only the top 10 results looks like this:

sg %>% 
  filter(sex %in% 'F') %>% 
  group_by(name) %>% 
  summarize(total = sum(n)) %>% 
  arrange(desc(total)) %>% 
  head(10) -> top_10_sg
## `summarise()` ungrouping output (override with `.groups` argument)
Top 10 Female Baby Names during the Silent Generation
name total
Mary 1068730
Barbara 569204
Betty 497493
Patricia 467885
Shirley 360998
Dorothy 360567
Carol 294095
Margaret 293317
Nancy 287484
Joan 269672
babynames %>% 
  filter(name %in% c("Mary", "Barbara", "Betty", "Patricia", "Shirley", "Dorothy", "Carol", "Nancy", "Margaret", "Joan") & sex %in% "F") %>% 
  ggplot(aes(year, prop, color = name)) + geom_line()