DACSS 601: Data Science Fundamentals - FALL 2022
  • Fall 2022 Posts
  • Contributors
  • DACSS

Challenge 8 Instructions

  • Course information
    • Overview
    • Instructional Team
    • Course Schedule
  • Weekly materials
    • Fall 2022 posts
    • final posts

On this page

  • Challenge Overview
  • Read in data
  • Snl data- (snl_actors.csv)
    • Briefly describe the data
  • Tidy Data (as needed)
  • Join Data

Challenge 8 Instructions

challenge_8
railroads
snl
faostat
debt
Joining Data
Author

Meredith Rolfe

Published

August 25, 2022

library(tidyverse)
library(ggplot2)
library(dplyr)
knitr::opts_chunk$set(echo = TRUE, warning=FALSE, message=FALSE)

Challenge Overview

Today’s challenge is to:

  1. read in multiple data sets, and describe the data set using both words and any supporting information (e.g., tables, etc)
  2. tidy data (as needed, including sanity checks)
  3. mutate variables as needed (including sanity checks)
  4. join two or more data sets and analyze some aspect of the joined data

(be sure to only include the category tags for the data you use!)

Read in data

Read in one (or more) of the following datasets, using the correct R package and command.

  • military marriages ⭐⭐
  • faostat ⭐⭐
  • railroads ⭐⭐⭐
  • fed_rate ⭐⭐⭐
  • debt ⭐⭐⭐
  • us_hh ⭐⭐⭐⭐
  • snl ⭐⭐⭐⭐⭐

Snl data- (snl_actors.csv)

actor <- read_csv('./_data/snl_actors.csv')
actor
# A tibble: 2,306 × 4
   aid            url           type  gender 
   <chr>          <chr>         <chr> <chr>  
 1 Kate McKinnon  /Cast/?KaMc   cast  female 
 2 Alex Moffat    /Cast/?AlMo   cast  male   
 3 Ego Nwodim     /Cast/?EgNw   cast  unknown
 4 Chris Redd     /Cast/?ChRe   cast  male   
 5 Kenan Thompson /Cast/?KeTh   cast  male   
 6 Carey Mulligan /Guests/?3677 guest andy   
 7 Marcus Mumford /Guests/?3679 guest male   
 8 Aidy Bryant    /Cast/?AiBr   cast  female 
 9 Steve Higgins  /Crew/?StHi   crew  male   
10 Mikey Day      /Cast/?MiDa   cast  male   
# … with 2,296 more rows
cast <- read_csv('./_data/snl_casts.csv')
cast
# A tibble: 614 × 8
   aid                sid featured first_epid last_epid update…¹ n_epi…² seaso…³
   <chr>            <dbl> <lgl>         <dbl>     <dbl> <lgl>      <dbl>   <dbl>
 1 A. Whitney Brown    11 TRUE       19860222        NA FALSE          8   0.444
 2 A. Whitney Brown    12 TRUE             NA        NA FALSE         20   1    
 3 A. Whitney Brown    13 TRUE             NA        NA FALSE         13   1    
 4 A. Whitney Brown    14 TRUE             NA        NA FALSE         20   1    
 5 A. Whitney Brown    15 TRUE             NA        NA FALSE         20   1    
 6 A. Whitney Brown    16 TRUE             NA        NA FALSE         20   1    
 7 Alan Zweibel         5 TRUE       19800409        NA FALSE          5   0.25 
 8 Sasheer Zamata      39 TRUE       20140118        NA FALSE         11   0.524
 9 Sasheer Zamata      40 TRUE             NA        NA FALSE         21   1    
10 Sasheer Zamata      41 FALSE            NA        NA FALSE         21   1    
# … with 604 more rows, and abbreviated variable names ¹​update_anchor,
#   ²​n_episodes, ³​season_fraction
season <- read_csv('./_data/snl_seasons.csv')
season
# A tibble: 46 × 5
     sid  year first_epid last_epid n_episodes
   <dbl> <dbl>      <dbl>     <dbl>      <dbl>
 1     1  1975   19751011  19760731         24
 2     2  1976   19760918  19770521         22
 3     3  1977   19770924  19780520         20
 4     4  1978   19781007  19790526         20
 5     5  1979   19791013  19800524         20
 6     6  1980   19801115  19810411         13
 7     7  1981   19811003  19820522         20
 8     8  1982   19820925  19830514         20
 9     9  1983   19831008  19840512         19
10    10  1984   19841006  19850413         17
# … with 36 more rows

Briefly describe the data

The data set we are looking at contains information about the actors in the TV show Saturday Night Live. Each row in the data set represents one actor, and the ‘aid’ column is used to uniquely identify each actor. This means that the ‘aid’ column acts as the primary key for the data set, and no two rows have the same value for this column. In addition to the ‘aid’ column, there are three other columns in the data set: ‘type’, ‘url’, and ‘gender’.

The ‘type’ column describes the type of actor that each row represents. The possible values for this column are ‘cast’, ‘crew’, ‘guest’, and ‘unknown’. The ‘url’ column is a combination of the ‘type’ column and an additional identifier for the actor. This additional identifier can be anywhere from 1 to 4 characters long and can consist of either letters or numbers, but not both. In some cases, the additional identifier is a 4 character code, while in other cases it is a 4 digit code.

The ‘url’ column does not contain any duplicate values (excluding missing values), which means that no two actors with a non-missing ‘url’ value have the same additional identifier. If the ‘type’ column is missing for a given row, then the ‘url’ value will also be missing. However, there is one row that does not follow this pattern: (‘Jack Handey’, NA, ‘crew’, ‘male’). This row has a missing ‘url’ value, but it does not have an ‘unknown’ value in the ‘type’ column.

Tidy Data (as needed)

subset(actor, is.na(url))
# A tibble: 57 × 4
   aid               url   type    gender
   <chr>             <chr> <chr>   <chr> 
 1 Don Roy King      <NA>  unknown male  
 2 Liam Payne        <NA>  unknown male  
 3 Louis Tomlinson   <NA>  unknown male  
 4 Zayn Malik        <NA>  unknown male  
 5 Caleb Followill   <NA>  unknown male  
 6 Jared Followill   <NA>  unknown male  
 7 Matthew Followill <NA>  unknown male  
 8 Nathan Followill  <NA>  unknown male  
 9 Regine Chassagne  <NA>  unknown female
10 William Butler    <NA>  unknown male  
# … with 47 more rows

57 observations are missing a value for the url column, and all of these observations have an unknown value for the type column. Only one of these observations with a missing url value is for the person named “Jack Handey”, who is listed as a crew member.

Now we will use subset() function to create a new data frame that contains only the rows of the actor data frame where the url column is NA (missing or null) and the type column is crew-

actor %>% 
  subset(is.na(url) & type == "crew") 
# A tibble: 1 × 4
  aid         url   type  gender
  <chr>       <chr> <chr> <chr> 
1 Jack Handey <NA>  crew  male  

Let’s create a new data frame that contains only the rows of the actor data frame where the gender column is andy-

actor %>%
  subset(gender == "andy")
# A tibble: 21 × 4
   aid            url           type    gender
   <chr>          <chr>         <chr>   <chr> 
 1 Carey Mulligan /Guests/?3677 guest   andy  
 2 Casey Davidson /Guests/?3593 guest   andy  
 3 Jackie Sandler /Guests/?3598 guest   andy  
 4 Casey Nicholaw /Guests/?3372 guest   andy  
 5 Skylar Grey    /Guests/?3275 guest   andy  
 6 Casey Affleck  /Guests/?3195 guest   andy  
 7 Win Butler     <NA>          unknown andy  
 8 Phoenix        /Guests/?2846 guest   andy  
 9 Pat Smear      /Guests/?2813 guest   andy  
10 Bon Iver       /Guests/?2713 guest   andy  
# … with 11 more rows
actor$gender[actor$gender=="andy"] <- "unknown"
actor
# A tibble: 2,306 × 4
   aid            url           type  gender 
   <chr>          <chr>         <chr> <chr>  
 1 Kate McKinnon  /Cast/?KaMc   cast  female 
 2 Alex Moffat    /Cast/?AlMo   cast  male   
 3 Ego Nwodim     /Cast/?EgNw   cast  unknown
 4 Chris Redd     /Cast/?ChRe   cast  male   
 5 Kenan Thompson /Cast/?KeTh   cast  male   
 6 Carey Mulligan /Guests/?3677 guest unknown
 7 Marcus Mumford /Guests/?3679 guest male   
 8 Aidy Bryant    /Cast/?AiBr   cast  female 
 9 Steve Higgins  /Crew/?StHi   crew  male   
10 Mikey Day      /Cast/?MiDa   cast  male   
# … with 2,296 more rows

Here, the gender column of the actor data frame is being updated by replacing the value andy with the value unknown.

Now, we will convert the first_epid and last_epid columns in the season data frame from numeric to Date format-

season <- transform(season, 
                         first_epid = as.Date(as.character(first_epid), "%Y%m%d"), 
                         last_epid = as.Date(as.character(last_epid), "%Y%m%d"))

season
   sid year first_epid  last_epid n_episodes
1    1 1975 1975-10-11 1976-07-31         24
2    2 1976 1976-09-18 1977-05-21         22
3    3 1977 1977-09-24 1978-05-20         20
4    4 1978 1978-10-07 1979-05-26         20
5    5 1979 1979-10-13 1980-05-24         20
6    6 1980 1980-11-15 1981-04-11         13
7    7 1981 1981-10-03 1982-05-22         20
8    8 1982 1982-09-25 1983-05-14         20
9    9 1983 1983-10-08 1984-05-12         19
10  10 1984 1984-10-06 1985-04-13         17
11  11 1985 1985-11-09 1986-05-24         18
12  12 1986 1986-10-11 1987-05-23         20
13  13 1987 1987-10-17 1988-02-27         13
14  14 1988 1988-10-08 1989-05-20         20
15  15 1989 1989-09-30 1990-05-19         20
16  16 1990 1990-09-29 1991-05-18         20
17  17 1991 1991-09-28 1992-05-16         20
18  18 1992 1992-09-26 1993-05-15         20
19  19 1993 1993-09-25 1994-05-14         20
20  20 1994 1994-09-24 1995-05-13         20
21  21 1995 1995-09-30 1996-05-18         20
22  22 1996 1996-09-28 1997-05-17         20
23  23 1997 1997-09-27 1998-05-09         20
24  24 1998 1998-09-26 1999-05-15         19
25  25 1999 1999-10-02 2000-05-20         20
26  26 2000 2000-10-07 2001-05-19         20
27  27 2001 2001-09-29 2002-05-18         20
28  28 2002 2002-10-05 2003-05-17         20
29  29 2003 2003-10-04 2004-05-15         20
30  30 2004 2004-10-02 2005-05-21         20
31  31 2005 2005-10-01 2006-05-20         19
32  32 2006 2006-09-30 2007-05-19         20
33  33 2007 2007-09-29 2008-05-17         12
34  34 2008 2008-09-13 2009-05-16         22
35  35 2009 2009-09-26 2010-05-15         22
36  36 2010 2010-09-25 2011-05-21         22
37  37 2011 2011-09-24 2012-05-19         22
38  38 2012 2012-09-15 2013-05-18         21
39  39 2013 2013-09-28 2014-05-17         21
40  40 2014 2014-09-27 2015-05-16         21
41  41 2015 2015-10-03 2016-05-21         21
42  42 2016 2016-10-01 2017-05-20         21
43  43 2017 2017-09-30 2018-05-19         21
44  44 2018 2018-09-29 2019-05-18         21
45  45 2019 2019-09-28 2020-05-09         18
46  46 2020 2020-10-03 2021-04-10         17
# Convert first_epid and last_epid to date objects
cast <- transform(cast, 
                  first_epid = as.Date(as.character(first_epid), "%Y%m%d"), 
                  last_epid = as.Date(as.character(last_epid), "%Y%m%d"))

# Filter out rows where first_epid or last_epid is NA
cast %>% filter(!is.na(first_epid)|!is.na(last_epid))
                  aid sid featured first_epid  last_epid update_anchor
1    A. Whitney Brown  11     TRUE 1986-02-22       <NA>         FALSE
2        Alan Zweibel   5     TRUE 1980-04-09       <NA>         FALSE
3      Sasheer Zamata  39     TRUE 2014-01-18       <NA>         FALSE
4           Fred Wolf  22     TRUE       <NA> 1996-10-19         FALSE
5        Casey Wilson  33     TRUE 2008-02-23       <NA>         FALSE
6        Kristen Wiig  31     TRUE 2005-11-12       <NA>         FALSE
7    Patrick Weathers   6     TRUE 1980-12-13       <NA>         FALSE
8        Damon Wayans  11     TRUE       <NA> 1986-03-15         FALSE
9    Michaela Watkins  34     TRUE 2008-11-15       <NA>         FALSE
10      Julia Sweeney  16     TRUE 1990-11-10       <NA>         FALSE
11     Jason Sudeikis  30     TRUE 2005-05-07       <NA>         FALSE
12        Ben Stiller  14     TRUE 1989-03-25       <NA>         FALSE
13        David Spade  16     TRUE 1990-11-10       <NA>         FALSE
14    Sarah Silverman  19     TRUE 1993-10-09       <NA>         FALSE
15      Harry Shearer  10    FALSE       <NA> 1985-01-12         FALSE
16      Molly Shannon  20     TRUE 1995-02-25       <NA>         FALSE
17      Molly Shannon  26    FALSE       <NA> 2001-02-17         FALSE
18       Paul Shaffer   5     TRUE 1979-11-17       <NA>         FALSE
19      Rob Schneider  16     TRUE 1990-10-27       <NA>         FALSE
20       Tom Schiller   5     TRUE 1980-04-09       <NA>         FALSE
21       Adam Sandler  16     TRUE 1991-02-09       <NA>         FALSE
22       Maya Rudolph  25     TRUE 2000-05-06       <NA>         FALSE
23       Maya Rudolph  33    FALSE       <NA> 2007-11-03         FALSE
24        Tony Rosato   6    FALSE 1981-04-11       <NA>         FALSE
25      Jeff Richards  29    FALSE       <NA> 2004-01-17         FALSE
26       Emily Prager   6     TRUE 1981-04-11       <NA>         FALSE
27        Amy Poehler  34    FALSE       <NA> 2008-12-13          TRUE
28      Chris Parnell  27    FALSE 2002-03-02       <NA>         FALSE
29 Michael O'Donoghue   1    FALSE       <NA> 1975-11-08         FALSE
30        Don Novello   5     TRUE 1979-10-13       <NA>         FALSE
31         Mike Myers  14     TRUE 1989-01-21       <NA>         FALSE
32         Mike Myers  20    FALSE       <NA> 1995-01-21         FALSE
33        Bill Murray   2    FALSE 1977-01-15       <NA>         FALSE
34       Eddie Murphy   6    FALSE 1980-12-13       <NA>         FALSE
35       Eddie Murphy   9    FALSE       <NA> 1984-02-25         FALSE
36           Jay Mohr  19     TRUE 1993-10-09       <NA>         FALSE
37        Seth Meyers  39    FALSE       <NA> 2014-02-01          TRUE
38     Laurie Metcalf   6     TRUE 1981-04-11       <NA>         FALSE
39        Tim Meadows  16     TRUE 1991-02-09       <NA>         FALSE
40      Kate McKinnon  37     TRUE 2012-04-07       <NA>         FALSE
41      Mark McKinney  20    FALSE 1995-01-14       <NA>         FALSE
42     Michael McKean  19    FALSE 1994-03-12       <NA>         FALSE
43     Norm MacDonald  19     TRUE 1993-10-02       <NA>         FALSE
44     Norm MacDonald  23    FALSE       <NA> 1998-03-14          TRUE
45   Matthew Laurance   6     TRUE 1980-12-13       <NA>         FALSE
46     Tim Kazurinsky   6    FALSE 1981-04-11       <NA>         FALSE
47       Chris Kattan  21     TRUE 1996-03-16       <NA>         FALSE
48         Colin Jost  39     TRUE 2014-03-01       <NA>          TRUE
49       Leslie Jones  40     TRUE 2014-10-25       <NA>         FALSE
50    Melanie Hutsell  17     TRUE 1991-11-16       <NA>         FALSE
51      Yvonne Hudson   6     TRUE 1980-12-20       <NA>         FALSE
52   Janeane Garofalo  20    FALSE       <NA> 1995-02-25         FALSE
53         Al Franken   5     TRUE 1979-12-15       <NA>         FALSE
54         Al Franken  11     TRUE 1986-03-22       <NA>         FALSE
55       Abby Elliott  34     TRUE 2008-11-15       <NA>         FALSE
56         Robin Duke   6    FALSE 1981-04-11       <NA>         FALSE
57      Rachel Dratch  25     TRUE 1999-10-23       <NA>         FALSE
58 Brian Doyle-Murray   5     TRUE 1980-01-26       <NA>         FALSE
59         Jim Downey   5     TRUE 1980-01-26       <NA>         FALSE
60          Tom Davis   5     TRUE 1979-11-17       <NA>         FALSE
61         George Coe   1    FALSE       <NA> 1975-10-11         FALSE
62        Chevy Chase   2    FALSE       <NA> 1976-10-30          TRUE
63        Dana Carvey  18    FALSE       <NA> 1993-02-06         FALSE
64        Beth Cahill  17     TRUE 1991-11-16       <NA>         FALSE
65      Paul Brittain  37     TRUE       <NA> 2012-01-14         FALSE
66     Morwenna Banks  20    FALSE 1995-04-08       <NA>         FALSE
67      Peter Aykroyd   5     TRUE 1980-01-26       <NA>         FALSE
   n_episodes season_fraction
1           8      0.44444444
2           5      0.25000000
3          11      0.52380952
4           3      0.15000000
5           8      0.66666667
6          15      0.78947368
7          10      0.76923077
8          12      0.66666667
9          15      0.68181818
10         16      0.80000000
11          3      0.15000000
12          6      0.30000000
13         16      0.80000000
14         18      0.90000000
15         10      0.58823529
16          7      0.35000000
17         12      0.60000000
18         16      0.80000000
19         17      0.85000000
20          5      0.25000000
21          9      0.45000000
22          3      0.15000000
23          4      0.33333333
24          1      0.07692308
25         10      0.50000000
26          1      0.07692308
27         11      0.50000000
28          8      0.40000000
29          4      0.16666667
30         20      1.00000000
31         11      0.55000000
32         11      0.55000000
33         12      0.54545455
34         10      0.76923077
35         14      0.73684211
36         18      0.90000000
37         13      0.61904762
38          1      0.07692308
39          9      0.45000000
40          5      0.22727273
41         11      0.55000000
42          6      0.30000000
43         19      0.95000000
44         16      0.80000000
45         10      0.76923077
46          1      0.07692308
47          6      0.30000000
48          8      0.38095238
49         18      0.85714286
50         15      0.75000000
51          9      0.69230769
52         14      0.70000000
53         14      0.70000000
54          6      0.33333333
55         15      0.68181818
56          1      0.07692308
57         18      0.90000000
58         12      0.60000000
59         12      0.60000000
60         16      0.80000000
61          1      0.04166667
62          6      0.27272727
63         12      0.60000000
64         15      0.75000000
65         12      0.54545455
66          4      0.20000000
67         12      0.60000000
subset(actor, str_detect(url, "/./?."))
# A tibble: 2,249 × 4
   aid            url           type  gender 
   <chr>          <chr>         <chr> <chr>  
 1 Kate McKinnon  /Cast/?KaMc   cast  female 
 2 Alex Moffat    /Cast/?AlMo   cast  male   
 3 Ego Nwodim     /Cast/?EgNw   cast  unknown
 4 Chris Redd     /Cast/?ChRe   cast  male   
 5 Kenan Thompson /Cast/?KeTh   cast  male   
 6 Carey Mulligan /Guests/?3677 guest unknown
 7 Marcus Mumford /Guests/?3679 guest male   
 8 Aidy Bryant    /Cast/?AiBr   cast  female 
 9 Steve Higgins  /Crew/?StHi   crew  male   
10 Mikey Day      /Cast/?MiDa   cast  male   
# … with 2,239 more rows
# Join the cast and season data frames using an inner join
cast_join <- cast %>%
  inner_join(season, by = "sid")
# replace the NA with the corresponding value in the first_epid.y column
cast_join$first_epid.x[is.na(cast_join$first_epid.x)] <- cast_join$first_epid.y
# replace the NA with the corresponding value in the last_epid.y column
cast_join$last_epid.x[is.na(cast_join$last_epid.x)] <- cast_join$last_epid.y
# Rename the columns in the cast_join
colnames(cast_join) <- c("aid", "sid", "featured", "first_epid_actor", "last_epid_actor", "upload_anchor", "n_episodes_actor", "%_apperance", "year", "first_epid_season", "last_epid_season", "n_episodes_season")
# Print cast_join
cast_join
                     aid sid featured first_epid_actor last_epid_actor
1       A. Whitney Brown  11     TRUE       1986-02-22      1986-05-24
2       A. Whitney Brown  12     TRUE       1985-11-09      1987-05-23
3       A. Whitney Brown  13     TRUE       1986-10-11      1988-02-27
4       A. Whitney Brown  14     TRUE       1987-10-17      1989-05-20
5       A. Whitney Brown  15     TRUE       1988-10-08      1990-05-19
6       A. Whitney Brown  16     TRUE       1989-09-30      1991-05-18
7           Alan Zweibel   5     TRUE       1980-04-09      1980-05-24
8         Sasheer Zamata  39     TRUE       2014-01-18      2014-05-17
9         Sasheer Zamata  40     TRUE       1990-09-29      2015-05-16
10        Sasheer Zamata  41    FALSE       1979-10-13      2016-05-21
11        Sasheer Zamata  42    FALSE       2013-09-28      2017-05-20
12            Bowen Yang  45     TRUE       2014-09-27      2020-05-09
13            Bowen Yang  46     TRUE       2015-10-03      2021-04-10
14             Fred Wolf  21     TRUE       2016-10-01      1996-05-18
15             Fred Wolf  22     TRUE       2019-09-28      1996-10-19
16          Casey Wilson  33     TRUE       2008-02-23      1997-05-17
17          Casey Wilson  34     TRUE       2020-10-03      2008-05-17
18          Kristen Wiig  31     TRUE       2005-11-12      2009-05-16
19          Kristen Wiig  32    FALSE       1995-09-30      2006-05-20
20          Kristen Wiig  33    FALSE       1996-09-28      2007-05-19
21          Kristen Wiig  34    FALSE       2007-09-29      2008-05-17
22          Kristen Wiig  35    FALSE       2008-09-13      2009-05-16
23          Kristen Wiig  36    FALSE       2005-10-01      2010-05-15
24          Kristen Wiig  37    FALSE       2006-09-30      2011-05-21
25        Brooks Wheelan  39     TRUE       2007-09-29      2012-05-19
26            Noel Wells  39     TRUE       2008-09-13      2014-05-17
27      Patrick Weathers   6     TRUE       1980-12-13      2014-05-17
28          Damon Wayans  11     TRUE       2009-09-26      1986-03-15
29      Michaela Watkins  34     TRUE       2008-11-15      1981-04-11
30           Nancy Walls  21    FALSE       2010-09-25      1986-05-24
31            Dan Vitale  11     TRUE       2011-09-24      2009-05-16
32    Melissa Villasenor  42     TRUE       2013-09-28      1996-05-18
33    Melissa Villasenor  43     TRUE       2013-09-28      1986-05-24
34    Melissa Villasenor  44    FALSE       1980-11-15      2017-05-20
35    Melissa Villasenor  45    FALSE       1985-11-09      2018-05-19
36    Melissa Villasenor  46    FALSE       2008-09-13      2019-05-18
37         Danitra Vance  11    FALSE       1995-09-30      2020-05-09
38        Kenan Thompson  29     TRUE       1985-11-09      2021-04-10
39        Kenan Thompson  30     TRUE       2016-10-01      1986-05-24
40        Kenan Thompson  31    FALSE       2017-09-30      2004-05-15
41        Kenan Thompson  32    FALSE       2018-09-29      2005-05-21
42        Kenan Thompson  33    FALSE       2019-09-28      2006-05-20
43        Kenan Thompson  34    FALSE       2020-10-03      2007-05-19
44        Kenan Thompson  35    FALSE       1985-11-09      2008-05-17
45        Kenan Thompson  36    FALSE       2003-10-04      2009-05-16
46        Kenan Thompson  37    FALSE       2004-10-02      2010-05-15
47        Kenan Thompson  38    FALSE       2005-10-01      2011-05-21
48        Kenan Thompson  39    FALSE       2006-09-30      2012-05-19
49        Kenan Thompson  40    FALSE       2007-09-29      2013-05-18
50        Kenan Thompson  41    FALSE       2008-09-13      2014-05-17
51        Kenan Thompson  42    FALSE       2009-09-26      2015-05-16
52        Kenan Thompson  43    FALSE       2010-09-25      2016-05-21
53        Kenan Thompson  44    FALSE       2011-09-24      2017-05-20
54        Kenan Thompson  45    FALSE       2012-09-15      2018-05-19
55        Kenan Thompson  46    FALSE       2013-09-28      2019-05-18
56         Terry Sweeney  11    FALSE       2014-09-27      2020-05-09
57         Julia Sweeney  16     TRUE       1990-11-10      2021-04-10
58         Julia Sweeney  17    FALSE       2015-10-03      1986-05-24
59         Julia Sweeney  18    FALSE       2016-10-01      1991-05-18
60         Julia Sweeney  19    FALSE       2017-09-30      1992-05-16
61        Jason Sudeikis  30     TRUE       2005-05-07      1993-05-15
62        Jason Sudeikis  31     TRUE       2018-09-29      1994-05-14
63        Jason Sudeikis  32    FALSE       2019-09-28      2005-05-21
64        Jason Sudeikis  33    FALSE       2020-10-03      2006-05-20
65        Jason Sudeikis  34    FALSE       1985-11-09      2007-05-19
66        Jason Sudeikis  35    FALSE       1990-09-29      2008-05-17
67        Jason Sudeikis  36    FALSE       1991-09-28      2009-05-16
68        Jason Sudeikis  37    FALSE       1992-09-26      2010-05-15
69        Jason Sudeikis  38    FALSE       1993-09-25      2011-05-21
70         Cecily Strong  38     TRUE       2004-10-02      2012-05-19
71         Cecily Strong  39    FALSE       2005-10-01      2013-05-18
72         Cecily Strong  40    FALSE       2006-09-30      2013-05-18
73         Cecily Strong  41    FALSE       2007-09-29      2014-05-17
74         Cecily Strong  42    FALSE       2008-09-13      2015-05-16
75         Cecily Strong  43    FALSE       2009-09-26      2016-05-21
76         Cecily Strong  44    FALSE       2010-09-25      2017-05-20
77         Cecily Strong  45    FALSE       2011-09-24      2018-05-19
78         Cecily Strong  46    FALSE       2012-09-15      2019-05-18
79           Ben Stiller  14     TRUE       1989-03-25      2020-05-09
80     Pamela Stephenson  10    FALSE       2012-09-15      2021-04-10
81           David Spade  16     TRUE       1990-11-10      1989-05-20
82           David Spade  17     TRUE       2013-09-28      1985-04-13
83           David Spade  18     TRUE       2014-09-27      1991-05-18
84           David Spade  19    FALSE       2015-10-03      1992-05-16
85           David Spade  20    FALSE       2016-10-01      1993-05-15
86           David Spade  21    FALSE       2017-09-30      1994-05-14
87         Robert Smigel  17     TRUE       2018-09-29      1995-05-13
88         Robert Smigel  18     TRUE       2019-09-28      1996-05-18
89           Jenny Slate  35     TRUE       2020-10-03      1992-05-16
90       Sarah Silverman  19     TRUE       1993-10-09      1993-05-15
91          Martin Short  10    FALSE       1988-10-08      2010-05-15
92         Harry Shearer   5    FALSE       1984-10-06      1994-05-14
93         Harry Shearer  10    FALSE       1990-09-29      1985-01-12
94         Molly Shannon  20     TRUE       1995-02-25      1985-04-13
95         Molly Shannon  21    FALSE       1991-09-28      1980-05-24
96         Molly Shannon  22    FALSE       1992-09-26      1985-04-13
97         Molly Shannon  23    FALSE       1993-09-25      1995-05-13
98         Molly Shannon  24    FALSE       1994-09-24      1996-05-18
99         Molly Shannon  25    FALSE       1995-09-30      1997-05-17
100        Molly Shannon  26    FALSE       1991-09-28      2001-02-17
101         Paul Shaffer   5     TRUE       1979-11-17      1998-05-09
102        Rob Schneider  16     TRUE       1990-10-27      1999-05-15
103        Rob Schneider  17     TRUE       1992-09-26      2000-05-20
104        Rob Schneider  18    FALSE       2009-09-26      2001-05-19
105        Rob Schneider  19    FALSE       1993-09-25      1980-05-24
106         Tom Schiller   5     TRUE       1980-04-09      1991-05-18
107         Horatio Sanz  24     TRUE       1984-10-06      1992-05-16
108         Horatio Sanz  25    FALSE       1979-10-13      1993-05-15
109         Horatio Sanz  26    FALSE       1984-10-06      1994-05-14
110         Horatio Sanz  27    FALSE       1994-09-24      1980-05-24
111         Horatio Sanz  28    FALSE       1995-09-30      1999-05-15
112         Horatio Sanz  29    FALSE       1996-09-28      2000-05-20
113         Horatio Sanz  30    FALSE       1997-09-27      2001-05-19
114         Horatio Sanz  31    FALSE       1998-09-26      2002-05-18
115         Adam Sandler  16     TRUE       1991-02-09      2003-05-17
116         Adam Sandler  17     TRUE       1999-10-02      2004-05-15
117         Adam Sandler  18     TRUE       2000-10-07      2005-05-21
118         Adam Sandler  19    FALSE       1979-10-13      2006-05-20
119         Adam Sandler  20    FALSE       1990-09-29      1991-05-18
120         Andy Samberg  31     TRUE       1991-09-28      1992-05-16
121         Andy Samberg  32    FALSE       1992-09-26      1993-05-15
122         Andy Samberg  33    FALSE       1993-09-25      1994-05-14
123         Andy Samberg  34    FALSE       1979-10-13      1995-05-13
124         Andy Samberg  35    FALSE       1998-09-26      2006-05-20
125         Andy Samberg  36    FALSE       1999-10-02      2007-05-19
126         Andy Samberg  37    FALSE       2000-10-07      2008-05-17
127         Maya Rudolph  25     TRUE       2000-05-06      2009-05-16
128         Maya Rudolph  26     TRUE       2001-09-29      2010-05-15
129         Maya Rudolph  27    FALSE       2002-10-05      2011-05-21
130         Maya Rudolph  28    FALSE       2003-10-04      2012-05-19
131         Maya Rudolph  29    FALSE       2004-10-02      2000-05-20
132         Maya Rudolph  30    FALSE       2005-10-01      2001-05-19
133         Maya Rudolph  31    FALSE       1990-09-29      2002-05-18
134         Maya Rudolph  32    FALSE       1991-09-28      2003-05-17
135         Maya Rudolph  33    FALSE       1992-09-26      2007-11-03
136        Jon Rudnitsky  41     TRUE       1993-09-25      2004-05-15
137          Tony Rosato   6    FALSE       1981-04-11      2005-05-21
138          Tony Rosato   7    FALSE       1994-09-24      2006-05-20
139       Charles Rocket   6    FALSE       2005-10-01      2007-05-19
140           Chris Rock  16     TRUE       2006-09-30      2008-05-17
141           Chris Rock  17    FALSE       2007-09-29      2016-05-21
142           Chris Rock  18    FALSE       2008-09-13      1981-04-11
143         Tim Robinson  38     TRUE       2009-09-26      1982-05-22
144           Ann Risley   6    FALSE       2010-09-25      1981-04-11
145           Rob Riggle  30     TRUE       2011-09-24      1991-05-18
146        Jeff Richards  27     TRUE       1999-10-02      1992-05-16
147        Jeff Richards  28     TRUE       2000-10-07      1993-05-15
148        Jeff Richards  29    FALSE       2001-09-29      2004-01-17
149           Chris Redd  43     TRUE       2002-10-05      2013-05-18
150           Chris Redd  44     TRUE       2003-10-04      1981-04-11
151           Chris Redd  45    FALSE       2004-10-02      2005-05-21
152           Chris Redd  46    FALSE       2005-10-01      2002-05-18
153         Gilda Radner   1    FALSE       2006-09-30      2003-05-17
154         Gilda Radner   2    FALSE       2007-09-29      2004-05-15
155         Gilda Radner   3    FALSE       2015-10-03      2018-05-19
156         Gilda Radner   4    FALSE       1980-11-15      2019-05-18
157         Gilda Radner   5    FALSE       1981-10-03      2020-05-09
158          Colin Quinn  21     TRUE       1980-11-15      2021-04-10
159          Colin Quinn  22     TRUE       1990-09-29      1976-07-31
160          Colin Quinn  23    FALSE       1991-09-28      1977-05-21
161          Colin Quinn  24    FALSE       1992-09-26      1978-05-20
162          Colin Quinn  25    FALSE       2012-09-15      1979-05-26
163          Randy Quaid  11    FALSE       1980-11-15      1980-05-24
164         Emily Prager   6     TRUE       1981-04-11      1996-05-18
165          Amy Poehler  27     TRUE       2004-10-02      1997-05-17
166          Amy Poehler  28    FALSE       2001-09-29      1998-05-09
167          Amy Poehler  29    FALSE       2002-10-05      1999-05-15
168          Amy Poehler  30    FALSE       2003-10-04      2000-05-20
169          Amy Poehler  31    FALSE       2017-09-30      1986-05-24
170          Amy Poehler  32    FALSE       2018-09-29      1981-04-11
171          Amy Poehler  33    FALSE       2019-09-28      2002-05-18
172          Amy Poehler  34    FALSE       2020-10-03      2008-12-13
173          Joe Piscopo   6    FALSE       1975-10-11      2003-05-17
174          Joe Piscopo   7    FALSE       1976-09-18      2004-05-15
175          Joe Piscopo   8    FALSE       1977-09-24      2005-05-21
176          Joe Piscopo   9    FALSE       1978-10-07      2006-05-20
177          Jay Pharoah  36     TRUE       1979-10-13      2007-05-19
178          Jay Pharoah  37     TRUE       1995-09-30      2008-05-17
179          Jay Pharoah  38    FALSE       1996-09-28      2009-05-16
180          Jay Pharoah  39    FALSE       1997-09-27      1981-04-11
181          Jay Pharoah  40    FALSE       1998-09-26      1982-05-22
182          Jay Pharoah  41    FALSE       1999-10-02      1983-05-14
183         Nasim Pedrad  35     TRUE       1985-11-09      1984-05-12
184         Nasim Pedrad  36     TRUE       1980-11-15      2011-05-21
185         Nasim Pedrad  37    FALSE       2001-09-29      2012-05-19
186         Nasim Pedrad  38    FALSE       2002-10-05      2013-05-18
187         Nasim Pedrad  39    FALSE       2003-10-04      2014-05-17
188        Chris Parnell  24     TRUE       2004-10-02      2015-05-16
189        Chris Parnell  25    FALSE       2005-10-01      2016-05-21
190        Chris Parnell  26    FALSE       2006-09-30      2010-05-15
191        Chris Parnell  27    FALSE       2002-03-02      2011-05-21
192        Chris Parnell  28    FALSE       2007-09-29      2012-05-19
193        Chris Parnell  29    FALSE       2008-09-13      2013-05-18
194        Chris Parnell  30    FALSE       1980-11-15      2014-05-17
195        Chris Parnell  31    FALSE       1981-10-03      1999-05-15
196          Cheri Oteri  21    FALSE       1982-09-25      2000-05-20
197          Cheri Oteri  22    FALSE       1983-10-08      2001-05-19
198          Cheri Oteri  23    FALSE       2010-09-25      2002-05-18
199          Cheri Oteri  24    FALSE       2011-09-24      2003-05-17
200          Cheri Oteri  25    FALSE       2012-09-15      2004-05-15
201   Michael O'Donoghue   1    FALSE       2013-09-28      1975-11-08
202         Mike O'Brien  39     TRUE       2014-09-27      2005-05-21
203           Ego Nwodim  44     TRUE       2015-10-03      2006-05-20
204           Ego Nwodim  45     TRUE       2009-09-26      1996-05-18
205           Ego Nwodim  46    FALSE       2010-09-25      1997-05-17
206            Luke Null  43     TRUE       2011-09-24      1998-05-09
207          Don Novello   5     TRUE       1979-10-13      1999-05-15
208          Don Novello  11     TRUE       2012-09-15      2000-05-20
209       Laraine Newman   1    FALSE       2013-09-28      1976-07-31
210       Laraine Newman   2    FALSE       1998-09-26      2014-05-17
211       Laraine Newman   3    FALSE       1999-10-02      2019-05-18
212       Laraine Newman   4    FALSE       2000-10-07      2020-05-09
213       Laraine Newman   5    FALSE       2001-09-29      2021-04-10
214         Kevin Nealon  12     TRUE       2002-10-05      2018-05-19
215         Kevin Nealon  13    FALSE       2003-10-04      1980-05-24
216         Kevin Nealon  14    FALSE       2004-10-02      1986-05-24
217         Kevin Nealon  15    FALSE       2005-10-01      1976-07-31
218         Kevin Nealon  16    FALSE       1995-09-30      1977-05-21
219         Kevin Nealon  17    FALSE       1996-09-28      1978-05-20
220         Kevin Nealon  18    FALSE       1997-09-27      1979-05-26
221         Kevin Nealon  19    FALSE       1998-09-26      1980-05-24
222         Kevin Nealon  20    FALSE       1999-10-02      1987-05-23
223           Mike Myers  14     TRUE       1989-01-21      1988-02-27
224           Mike Myers  15    FALSE       1975-10-11      1989-05-20
225           Mike Myers  16    FALSE       2013-09-28      1990-05-19
226           Mike Myers  17    FALSE       2018-09-29      1991-05-18
227           Mike Myers  18    FALSE       2019-09-28      1992-05-16
228           Mike Myers  19    FALSE       2020-10-03      1993-05-15
229           Mike Myers  20    FALSE       2017-09-30      1995-01-21
230          Bill Murray   2    FALSE       1977-01-15      1994-05-14
231          Bill Murray   3    FALSE       1979-10-13      1995-05-13
232          Bill Murray   4    FALSE       1985-11-09      1989-05-20
233          Bill Murray   5    FALSE       1975-10-11      1990-05-19
234         Eddie Murphy   6    FALSE       1980-12-13      1991-05-18
235         Eddie Murphy   7    FALSE       1976-09-18      1992-05-16
236         Eddie Murphy   8    FALSE       1977-09-24      1993-05-15
237         Eddie Murphy   9    FALSE       1978-10-07      1984-02-25
238       Bobby Moynihan  34     TRUE       1979-10-13      1994-05-14
239       Bobby Moynihan  35     TRUE       1986-10-11      1995-05-13
240       Bobby Moynihan  36    FALSE       1987-10-17      1977-05-21
241       Bobby Moynihan  37    FALSE       1988-10-08      1978-05-20
242       Bobby Moynihan  38    FALSE       1989-09-30      1979-05-26
243       Bobby Moynihan  39    FALSE       1990-09-29      1980-05-24
244       Bobby Moynihan  40    FALSE       1991-09-28      1981-04-11
245       Bobby Moynihan  41    FALSE       1992-09-26      1982-05-22
246       Bobby Moynihan  42    FALSE       1993-09-25      1983-05-14
247       Garrett Morris   1    FALSE       1994-09-24      1984-05-12
248       Garrett Morris   2    FALSE       1988-10-08      2009-05-16
249       Garrett Morris   3    FALSE       1989-09-30      2010-05-15
250       Garrett Morris   4    FALSE       1990-09-29      2011-05-21
251       Garrett Morris   5    FALSE       1991-09-28      2012-05-19
252         Tracy Morgan  22    FALSE       1992-09-26      2013-05-18
253         Tracy Morgan  23    FALSE       1993-09-25      2014-05-17
254         Tracy Morgan  24    FALSE       1994-09-24      2015-05-16
255         Tracy Morgan  25    FALSE       1976-09-18      2016-05-21
256         Tracy Morgan  26    FALSE       1977-09-24      2017-05-20
257         Tracy Morgan  27    FALSE       1978-10-07      1976-07-31
258         Tracy Morgan  28    FALSE       1979-10-13      1977-05-21
259          Kyle Mooney  39     TRUE       1980-11-15      1978-05-20
260          Kyle Mooney  40     TRUE       1981-10-03      1979-05-26
261          Kyle Mooney  41    FALSE       1982-09-25      1980-05-24
262          Kyle Mooney  42    FALSE       1983-10-08      1997-05-17
263          Kyle Mooney  43    FALSE       2008-09-13      1998-05-09
264          Kyle Mooney  44    FALSE       2009-09-26      1999-05-15
265          Kyle Mooney  45    FALSE       2010-09-25      2000-05-20
266          Kyle Mooney  46    FALSE       2011-09-24      2001-05-19
267             Jay Mohr  19     TRUE       1993-10-09      2002-05-18
268             Jay Mohr  20     TRUE       2012-09-15      2003-05-17
269          Alex Moffat  42     TRUE       2013-09-28      2014-05-17
270          Alex Moffat  43     TRUE       2014-09-27      2015-05-16
271          Alex Moffat  44    FALSE       2015-10-03      2016-05-21
272          Alex Moffat  45    FALSE       2016-10-01      2017-05-20
273          Alex Moffat  46    FALSE       1975-10-11      2018-05-19
274     Finesse Mitchell  29     TRUE       1976-09-18      2019-05-18
275     Finesse Mitchell  30     TRUE       1977-09-24      2020-05-09
276     Finesse Mitchell  31    FALSE       1978-10-07      2021-04-10
277          Jerry Minor  26     TRUE       1979-10-13      1994-05-14
278        Dennis Miller  11    FALSE       1996-09-28      1995-05-13
279        Dennis Miller  12    FALSE       1997-09-27      2017-05-20
280        Dennis Miller  13    FALSE       1998-09-26      2018-05-19
281        Dennis Miller  14    FALSE       1999-10-02      2019-05-18
282        Dennis Miller  15    FALSE       2000-10-07      2020-05-09
283        Dennis Miller  16    FALSE       2001-09-29      2021-04-10
284        John Milhiser  39     TRUE       2002-10-05      2004-05-15
285          Seth Meyers  27     TRUE       2013-09-28      2005-05-21
286          Seth Meyers  28     TRUE       2014-09-27      2006-05-20
287          Seth Meyers  29    FALSE       2015-10-03      2001-05-19
288          Seth Meyers  30    FALSE       2016-10-01      1986-05-24
289          Seth Meyers  31    FALSE       2017-09-30      1987-05-23
290          Seth Meyers  32    FALSE       2018-09-29      1988-02-27
291          Seth Meyers  33    FALSE       2019-09-28      1989-05-20
292          Seth Meyers  34    FALSE       2020-10-03      1990-05-19
293          Seth Meyers  35    FALSE       1993-09-25      1991-05-18
294          Seth Meyers  36    FALSE       1994-09-24      2014-05-17
295          Seth Meyers  37    FALSE       2016-10-01      2002-05-18
296          Seth Meyers  38    FALSE       2017-09-30      2003-05-17
297          Seth Meyers  39    FALSE       2018-09-29      2014-02-01
298       Laurie Metcalf   6     TRUE       1981-04-11      2004-05-15
299          Tim Meadows  16     TRUE       1991-02-09      2005-05-21
300          Tim Meadows  17     TRUE       2019-09-28      2006-05-20
301          Tim Meadows  18     TRUE       2020-10-03      2007-05-19
302          Tim Meadows  19    FALSE       2003-10-04      2008-05-17
303          Tim Meadows  20    FALSE       2004-10-02      2009-05-16
304          Tim Meadows  21    FALSE       2005-10-01      2010-05-15
305          Tim Meadows  22    FALSE       2000-10-07      2011-05-21
306          Tim Meadows  23    FALSE       1985-11-09      2012-05-19
307          Tim Meadows  24    FALSE       1986-10-11      2013-05-18
308          Tim Meadows  25    FALSE       1987-10-17      2014-05-17
309        Kate McKinnon  37     TRUE       2012-04-07      1981-04-11
310        Kate McKinnon  38     TRUE       1988-10-08      1991-05-18
311        Kate McKinnon  39    FALSE       1989-09-30      1992-05-16
312        Kate McKinnon  40    FALSE       1990-09-29      1993-05-15
313        Kate McKinnon  41    FALSE       2013-09-28      1994-05-14
314        Kate McKinnon  42    FALSE       2001-09-29      1995-05-13
315        Kate McKinnon  43    FALSE       2002-10-05      1996-05-18
316        Kate McKinnon  44    FALSE       2003-10-04      1997-05-17
317        Kate McKinnon  45    FALSE       2004-10-02      1998-05-09
318        Kate McKinnon  46    FALSE       2005-10-01      1999-05-15
319        Mark McKinney  20    FALSE       1995-01-14      2000-05-20
320        Mark McKinney  21    FALSE       2006-09-30      2012-05-19
321        Mark McKinney  22    FALSE       2007-09-29      2013-05-18
322       Michael McKean  19    FALSE       1994-03-12      2014-05-17
323       Michael McKean  20    FALSE       2008-09-13      2015-05-16
324        Gail Matthius   6    FALSE       2009-09-26      2016-05-21
325       Norm MacDonald  19     TRUE       1993-10-02      2017-05-20
326       Norm MacDonald  20    FALSE       2010-09-25      2018-05-19
327       Norm MacDonald  21    FALSE       2011-09-24      2019-05-18
328       Norm MacDonald  22    FALSE       2012-09-15      2020-05-09
329       Norm MacDonald  23    FALSE       2013-09-28      1998-03-14
330           Jon Lovitz  11    FALSE       1980-11-15      2021-04-10
331           Jon Lovitz  12    FALSE       1990-09-29      1995-05-13
332           Jon Lovitz  13    FALSE       1991-09-28      1996-05-18
333           Jon Lovitz  14    FALSE       1992-09-26      1997-05-17
334           Jon Lovitz  15    FALSE       1993-09-25      1994-05-14
335  Julia Louis-Dreyfus   8    FALSE       1994-09-24      1995-05-13
336  Julia Louis-Dreyfus   9    FALSE       1995-09-30      1981-04-11
337  Julia Louis-Dreyfus  10    FALSE       1996-09-28      1994-05-14
338     Matthew Laurance   6     TRUE       1980-12-13      1995-05-13
339         Gary Kroeger   8    FALSE       1997-09-27      1996-05-18
340         Gary Kroeger   9    FALSE       1998-09-26      1997-05-17
341         Gary Kroeger  10    FALSE       1999-10-02      1998-05-09
342       David Koechner  21    FALSE       2011-09-24      1986-05-24
343         Taran Killam  36     TRUE       2012-09-15      1987-05-23
344         Taran Killam  37     TRUE       2013-09-28      1988-02-27
345         Taran Killam  38    FALSE       2014-09-27      1989-05-20
346         Taran Killam  39    FALSE       2015-10-03      1990-05-19
347         Taran Killam  40    FALSE       2016-10-01      1983-05-14
348         Taran Killam  41    FALSE       2017-09-30      1984-05-12
349    Laura Kightlinger  20     TRUE       2018-09-29      1985-04-13
350       Tim Kazurinsky   6    FALSE       1981-04-11      1981-04-11
351       Tim Kazurinsky   7    FALSE       2019-09-28      1983-05-14
352       Tim Kazurinsky   8    FALSE       2020-10-03      1984-05-12
353       Tim Kazurinsky   9    FALSE       1994-09-24      1985-04-13
354         Chris Kattan  21     TRUE       1996-03-16      1996-05-18
355         Chris Kattan  22    FALSE       1995-09-30      2011-05-21
356         Chris Kattan  23    FALSE       1996-09-28      2012-05-19
357         Chris Kattan  24    FALSE       1993-09-25      2013-05-18
358         Chris Kattan  25    FALSE       1994-09-24      2014-05-17
359         Chris Kattan  26    FALSE       1980-11-15      2015-05-16
360         Chris Kattan  27    FALSE       1993-09-25      2016-05-21
361         Chris Kattan  28    FALSE       1994-09-24      1995-05-13
362           Colin Jost  39     TRUE       2014-03-01      1981-04-11
363           Colin Jost  40     TRUE       1995-09-30      1982-05-22
364           Colin Jost  41    FALSE       1996-09-28      1983-05-14
365           Colin Jost  42    FALSE       1997-09-27      1984-05-12
366           Colin Jost  43    FALSE       1985-11-09      1996-05-18
367           Colin Jost  44    FALSE       1986-10-11      1997-05-17
368           Colin Jost  45    FALSE       1987-10-17      1998-05-09
369           Colin Jost  46    FALSE       1988-10-08      1999-05-15
370         Leslie Jones  40     TRUE       2014-10-25      2000-05-20
371         Leslie Jones  41     TRUE       1989-09-30      2001-05-19
372         Leslie Jones  42    FALSE       1982-09-25      2002-05-18
373         Leslie Jones  43    FALSE       1983-10-08      2003-05-17
374         Leslie Jones  44    FALSE       1984-10-06      2014-05-17
375       Punkie Johnson  46     TRUE       1980-11-15      2015-05-16
376     Victoria Jackson  12    FALSE       1982-09-25      2016-05-21
377     Victoria Jackson  13    FALSE       1983-10-08      2017-05-20
378     Victoria Jackson  14    FALSE       1984-10-06      2018-05-19
379     Victoria Jackson  15    FALSE       1995-09-30      2019-05-18
380     Victoria Jackson  16    FALSE       2010-09-25      2020-05-09
381     Victoria Jackson  17    FALSE       2011-09-24      2021-04-10
382      Melanie Hutsell  17     TRUE       1991-11-16      2015-05-16
383      Melanie Hutsell  18     TRUE       2012-09-15      2016-05-21
384      Melanie Hutsell  19    FALSE       2013-09-28      2017-05-20
385        Yvonne Hudson   6     TRUE       1980-12-20      2018-05-19
386            Jan Hooks  12    FALSE       2014-09-27      2019-05-18
387            Jan Hooks  13    FALSE       2015-10-03      2021-04-10
388            Jan Hooks  14    FALSE       1994-09-24      1987-05-23
389            Jan Hooks  15    FALSE       1980-11-15      1988-02-27
390            Jan Hooks  16    FALSE       1981-10-03      1989-05-20
391          Lauren Holt  46     TRUE       1982-09-25      1990-05-19
392         Phil Hartman  12    FALSE       1983-10-08      1991-05-18
393         Phil Hartman  13    FALSE       1995-09-30      1992-05-16
394         Phil Hartman  14    FALSE       1996-09-28      1992-05-16
395         Phil Hartman  15    FALSE       1997-09-27      1993-05-15
396         Phil Hartman  16    FALSE       1998-09-26      1994-05-14
397         Phil Hartman  17    FALSE       1999-10-02      1981-04-11
398         Phil Hartman  18    FALSE       2000-10-07      1987-05-23
399         Phil Hartman  19    FALSE       2001-09-29      1988-02-27
400      Darrell Hammond  21    FALSE       2002-10-05      1989-05-20
401      Darrell Hammond  22    FALSE       2013-09-28      1990-05-19
402      Darrell Hammond  23    FALSE       2014-09-27      1991-05-18
403      Darrell Hammond  24    FALSE       2015-10-03      2021-04-10
404      Darrell Hammond  25    FALSE       2016-10-01      1987-05-23
405      Darrell Hammond  26    FALSE       2017-09-30      1988-02-27
406      Darrell Hammond  27    FALSE       2018-09-29      1989-05-20
407      Darrell Hammond  28    FALSE       2019-09-28      1990-05-19
408      Darrell Hammond  29    FALSE       2020-10-03      1991-05-18
409      Darrell Hammond  30    FALSE       2014-09-27      1992-05-16
410      Darrell Hammond  31    FALSE       2015-10-03      1993-05-15
411      Darrell Hammond  32    FALSE       2016-10-01      1994-05-14
412      Darrell Hammond  33    FALSE       2017-09-30      1996-05-18
413      Darrell Hammond  34    FALSE       2018-09-29      1997-05-17
414            Rich Hall  10    FALSE       2020-10-03      1998-05-09
415            Brad Hall   8    FALSE       1986-10-11      1999-05-15
416            Brad Hall   9    FALSE       1987-10-17      2000-05-20
417 Anthony Michael Hall  11    FALSE       1988-10-08      2001-05-19
418           Bill Hader  31     TRUE       1989-09-30      2002-05-18
419           Bill Hader  32    FALSE       1990-09-29      2003-05-17
420           Bill Hader  33    FALSE       1991-09-28      2004-05-15
421           Bill Hader  34    FALSE       1991-09-28      2005-05-21
422           Bill Hader  35    FALSE       1992-09-26      2006-05-20
423           Bill Hader  36    FALSE       1993-09-25      2007-05-19
424           Bill Hader  37    FALSE       1980-11-15      2008-05-17
425           Bill Hader  38    FALSE       1986-10-11      2009-05-16
426    Christopher Guest  10    FALSE       1987-10-17      1985-04-13
427           Mary Gross   7    FALSE       1988-10-08      1983-05-14
428           Mary Gross   8    FALSE       1989-09-30      1984-05-12
429           Mary Gross   9    FALSE       1990-09-29      1986-05-24
430           Mary Gross  10    FALSE       2020-10-03      2006-05-20
431    Gilbert Gottfried   6    FALSE       1986-10-11      2007-05-19
432         Ana Gasteyer  22    FALSE       1987-10-17      2008-05-17
433         Ana Gasteyer  23    FALSE       1988-10-08      2009-05-16
434         Ana Gasteyer  24    FALSE       1989-09-30      2010-05-15
435         Ana Gasteyer  25    FALSE       1990-09-29      2011-05-21
436         Ana Gasteyer  26    FALSE       1991-09-28      2012-05-19
437         Ana Gasteyer  27    FALSE       1992-09-26      2013-05-18
438     Janeane Garofalo  20    FALSE       1993-09-25      1995-02-25
439        Heidi Gardner  43     TRUE       1995-09-30      1985-04-13
440        Heidi Gardner  44     TRUE       1996-09-28      1982-05-22
441        Heidi Gardner  45    FALSE       1997-09-27      1983-05-14
442        Heidi Gardner  46    FALSE       1998-09-26      1984-05-12
443           Al Franken   3     TRUE       1999-10-02      1985-04-13
444           Al Franken   4     TRUE       2000-10-07      1981-04-11
445           Al Franken   5     TRUE       1979-12-15      1997-05-17
446           Al Franken  11     TRUE       1986-03-22      1998-05-09
447           Al Franken  14     TRUE       2001-09-29      1999-05-15
448           Al Franken  15     TRUE       2002-10-05      2000-05-20
449           Al Franken  16     TRUE       2003-10-04      2001-05-19
450           Al Franken  17     TRUE       2004-10-02      2002-05-18
451           Al Franken  18     TRUE       2005-10-01      1995-05-13
452           Al Franken  19     TRUE       2006-09-30      2018-05-19
453           Al Franken  20     TRUE       2007-09-29      2019-05-18
454           Will Forte  28     TRUE       2008-09-13      2020-05-09
455           Will Forte  29    FALSE       1984-10-06      2021-04-10
456           Will Forte  30    FALSE       1982-09-25      1978-05-20
457           Will Forte  31    FALSE       1983-10-08      1979-05-26
458           Will Forte  32    FALSE       1985-11-09      1980-05-24
459           Will Forte  33    FALSE       2005-10-01      1986-05-24
460           Will Forte  34    FALSE       2006-09-30      1989-05-20
461           Will Forte  35    FALSE       2007-09-29      1990-05-19
462        Chloe Fineman  45     TRUE       2008-09-13      1991-05-18
463        Chloe Fineman  46     TRUE       2009-09-26      1992-05-16
464             Tina Fey  26     TRUE       2010-09-25      1993-05-15
465             Tina Fey  27    FALSE       2011-09-24      1994-05-14
466             Tina Fey  28    FALSE       2012-09-15      1995-05-13
467             Tina Fey  29    FALSE       1984-10-06      2003-05-17
468             Tina Fey  30    FALSE       1981-10-03      2004-05-15
469             Tina Fey  31    FALSE       1982-09-25      2005-05-21
470         Will Ferrell  21    FALSE       1983-10-08      2006-05-20
471         Will Ferrell  22    FALSE       1984-10-06      2007-05-19
472         Will Ferrell  23    FALSE       1980-11-15      2008-05-17
473         Will Ferrell  24    FALSE       1996-09-28      2009-05-16
474         Will Ferrell  25    FALSE       1997-09-27      2010-05-15
475         Will Ferrell  26    FALSE       1998-09-26      2020-05-09
476         Will Ferrell  27    FALSE       1999-10-02      2021-04-10
477         Chris Farley  16     TRUE       2000-10-07      2001-05-19
478         Chris Farley  17    FALSE       2001-09-29      2002-05-18
479         Chris Farley  18    FALSE       1994-09-24      2003-05-17
480         Chris Farley  19    FALSE       2017-09-30      2004-05-15
481         Chris Farley  20    FALSE       2018-09-29      2005-05-21
482       Siobhan Fallon  17     TRUE       2019-09-28      2006-05-20
483         Jimmy Fallon  24     TRUE       2020-10-03      1996-05-18
484         Jimmy Fallon  25    FALSE       1977-09-24      1997-05-17
485         Jimmy Fallon  26    FALSE       1978-10-07      1998-05-09
486         Jimmy Fallon  27    FALSE       1979-10-13      1999-05-15
487         Jimmy Fallon  28    FALSE       1985-11-09      2000-05-20
488         Jimmy Fallon  29    FALSE       1988-10-08      2001-05-19
489        Chris Elliott  20    FALSE       1989-09-30      2002-05-18
490         Abby Elliott  34     TRUE       2008-11-15      1991-05-18
491         Abby Elliott  35     TRUE       1990-09-29      1992-05-16
492         Abby Elliott  36    FALSE       1991-09-28      1993-05-15
493         Abby Elliott  37    FALSE       1992-09-26      1994-05-14
494         Dean Edwards  27     TRUE       1993-09-25      1995-05-13
495         Dean Edwards  28     TRUE       1994-09-24      1992-05-16
496   Christine Ebersole   7    FALSE       2002-10-05      1999-05-15
497            Nora Dunn  11    FALSE       2003-10-04      2000-05-20
498            Nora Dunn  12    FALSE       2004-10-02      2001-05-19
499            Nora Dunn  13    FALSE       2005-10-01      2002-05-18
500            Nora Dunn  14    FALSE       2006-09-30      2003-05-17
501            Nora Dunn  15    FALSE       2007-09-29      2004-05-15
502           Robin Duke   6    FALSE       1981-04-11      1995-05-13
503           Robin Duke   7    FALSE       2008-09-13      2009-05-16
504           Robin Duke   8    FALSE       2009-09-26      2010-05-15
505           Robin Duke   9    FALSE       2019-09-28      2011-05-21
506        Rachel Dratch  25     TRUE       1999-10-23      2012-05-19
507        Rachel Dratch  26     TRUE       2020-10-03      2002-05-18
508        Rachel Dratch  27    FALSE       2000-10-07      2003-05-17
509        Rachel Dratch  28    FALSE       2001-09-29      1982-05-22
510        Rachel Dratch  29    FALSE       2002-10-05      1986-05-24
511        Rachel Dratch  30    FALSE       2003-10-04      1987-05-23
512        Rachel Dratch  31    FALSE       2004-10-02      1988-02-27
513   Brian Doyle-Murray   5     TRUE       1980-01-26      1989-05-20
514   Brian Doyle-Murray   7     TRUE       2005-10-01      1990-05-19
515    Robert Downey Jr.  11    FALSE       1995-09-30      1981-04-11
516           Jim Downey   5     TRUE       1980-01-26      1982-05-22
517      Andrew Dismukes  46     TRUE       1996-09-28      1983-05-14
518         Denny Dillon   6    FALSE       1997-09-27      1984-05-12
519            Mikey Day  42     TRUE       1998-09-26      2000-05-20
520            Mikey Day  43     TRUE       1999-10-02      2001-05-19
521            Mikey Day  44    FALSE       2000-10-07      2002-05-18
522            Mikey Day  45    FALSE       2001-09-29      2003-05-17
523            Mikey Day  46    FALSE       1990-09-29      2004-05-15
524            Tom Davis   3     TRUE       1991-09-28      2005-05-21
525            Tom Davis   4     TRUE       1992-09-26      2006-05-20
526            Tom Davis   5     TRUE       1979-11-17      1980-05-24
527        Pete Davidson  40     TRUE       1993-09-25      1982-05-22
528        Pete Davidson  41     TRUE       1994-09-24      1986-05-24
529        Pete Davidson  42    FALSE       1991-09-28      1980-05-24
530        Pete Davidson  43    FALSE       1998-09-26      2021-04-10
531        Pete Davidson  44    FALSE       1999-10-02      1981-04-11
532        Pete Davidson  45    FALSE       2000-10-07      2017-05-20
533        Pete Davidson  46    FALSE       2001-09-29      2018-05-19
534          Joan Cusack  11    FALSE       2002-10-05      2019-05-18
535          Jane Curtin   1    FALSE       2003-10-04      2020-05-09
536          Jane Curtin   2    FALSE       1994-09-24      2021-04-10
537          Jane Curtin   3    FALSE       2008-09-13      1978-05-20
538          Jane Curtin   4    FALSE       2009-09-26      1979-05-26
539          Jane Curtin   5    FALSE       2010-09-25      1980-05-24
540        Billy Crystal  10    FALSE       2011-09-24      2015-05-16
541           George Coe   1    FALSE       2001-09-29      1975-10-11
542      Ellen Cleghorne  17     TRUE       2002-10-05      2016-05-21
543      Ellen Cleghorne  18     TRUE       1981-10-03      2017-05-20
544      Ellen Cleghorne  19    FALSE       1985-11-09      2018-05-19
545      Ellen Cleghorne  20    FALSE       1986-10-11      2019-05-18
546          Michael Che  40     TRUE       1987-10-17      2020-05-09
547          Michael Che  41     TRUE       1988-10-08      2021-04-10
548          Michael Che  42    FALSE       1989-09-30      1986-05-24
549          Michael Che  43    FALSE       1980-11-15      1976-07-31
550          Michael Che  44    FALSE       1981-10-03      1977-05-21
551          Michael Che  45    FALSE       1982-09-25      1978-05-20
552          Michael Che  46    FALSE       1983-10-08      1979-05-26
553          Chevy Chase   1    FALSE       1999-10-02      1980-05-24
554          Chevy Chase   2    FALSE       2000-10-07      1976-10-30
555          Dana Carvey  12    FALSE       2001-09-29      1985-04-13
556          Dana Carvey  13    FALSE       2002-10-05      1976-07-31
557          Dana Carvey  14    FALSE       2003-10-04      1992-05-16
558          Dana Carvey  15    FALSE       2004-10-02      1993-05-15
559          Dana Carvey  16    FALSE       2005-10-01      1994-05-14
560          Dana Carvey  17    FALSE       1979-10-13      1995-05-13
561          Dana Carvey  18    FALSE       1981-10-03      1993-02-06
562          Beth Cahill  17     TRUE       1991-11-16      2015-05-16
563          Aidy Bryant  38     TRUE       1985-11-09      2016-05-21
564          Aidy Bryant  39    FALSE       1979-10-13      2017-05-20
565          Aidy Bryant  40    FALSE       2020-10-03      2018-05-19
566          Aidy Bryant  41    FALSE       1980-11-15      2019-05-18
567          Aidy Bryant  42    FALSE       2016-10-01      2020-05-09
568          Aidy Bryant  43    FALSE       2017-09-30      2021-04-10
569          Aidy Bryant  44    FALSE       2018-09-29      1976-07-31
570          Aidy Bryant  45    FALSE       2019-09-28      1977-05-21
571          Aidy Bryant  46    FALSE       2020-10-03      1987-05-23
572        Paul Brittain  36     TRUE       1977-09-24      1988-02-27
573        Paul Brittain  37     TRUE       1978-10-07      2012-01-14
574           Jim Breuer  21    FALSE       1979-10-13      1989-05-20
575           Jim Breuer  22    FALSE       2014-09-27      1990-05-19
576           Jim Breuer  23    FALSE       2015-10-03      1991-05-18
577         Beck Bennett  39     TRUE       2016-10-01      1992-05-16
578         Beck Bennett  40     TRUE       2017-09-30      1993-05-15
579         Beck Bennett  41    FALSE       2018-09-29      1992-05-16
580         Beck Bennett  42    FALSE       2019-09-28      2013-05-18
581         Beck Bennett  43    FALSE       2020-10-03      2014-05-17
582         Beck Bennett  44    FALSE       1985-11-09      2015-05-16
583         Beck Bennett  45    FALSE       1975-10-11      2016-05-21
584         Beck Bennett  46    FALSE       1976-09-18      2017-05-20
585         John Belushi   1    FALSE       1977-09-24      2018-05-19
586         John Belushi   2    FALSE       1978-10-07      2019-05-18
587         John Belushi   3    FALSE       1979-10-13      2020-05-09
588         John Belushi   4    FALSE       1984-10-06      2021-04-10
589          Jim Belushi   9    FALSE       1975-10-11      2011-05-21
590          Jim Belushi  10    FALSE       1991-09-28      2012-05-19
591        Vanessa Bayer  36     TRUE       1992-09-26      1996-05-18
592        Vanessa Bayer  37     TRUE       1993-09-25      1997-05-17
593        Vanessa Bayer  38    FALSE       1994-09-24      1998-05-09
594        Vanessa Bayer  39    FALSE       2014-09-27      2014-05-17
595        Vanessa Bayer  40    FALSE       2015-10-03      2015-05-16
596        Vanessa Bayer  41    FALSE       2016-10-01      2016-05-21
597        Vanessa Bayer  42    FALSE       2017-09-30      2017-05-20
598       Morwenna Banks  20    FALSE       1995-04-08      2018-05-19
599        Peter Aykroyd   5     TRUE       1980-01-26      2019-05-18
600          Dan Aykroyd   1    FALSE       2018-09-29      2020-05-09
601          Dan Aykroyd   2    FALSE       2019-09-28      2021-04-10
602          Dan Aykroyd   3    FALSE       2020-10-03      1976-07-31
603          Dan Aykroyd   4    FALSE       1975-10-11      1977-05-21
604         Fred Armisen  28     TRUE       1976-09-18      1978-05-20
605         Fred Armisen  29     TRUE       1986-10-11      1979-05-26
606         Fred Armisen  30    FALSE       1987-10-17      1984-05-12
607         Fred Armisen  31    FALSE       1988-10-08      1985-04-13
608         Fred Armisen  32    FALSE       1989-09-30      2011-05-21
609         Fred Armisen  33    FALSE       1990-09-29      2012-05-19
610         Fred Armisen  34    FALSE       1991-09-28      2013-05-18
611         Fred Armisen  35    FALSE       1992-09-26      2014-05-17
612         Fred Armisen  36    FALSE       1991-09-28      2015-05-16
613         Fred Armisen  37    FALSE       2012-09-15      2016-05-21
614         Fred Armisen  38    FALSE       2013-09-28      2017-05-20
    upload_anchor n_episodes_actor %_apperance year first_epid_season
1           FALSE                8  0.44444444 1985        1985-11-09
2           FALSE               20  1.00000000 1986        1986-10-11
3           FALSE               13  1.00000000 1987        1987-10-17
4           FALSE               20  1.00000000 1988        1988-10-08
5           FALSE               20  1.00000000 1989        1989-09-30
6           FALSE               20  1.00000000 1990        1990-09-29
7           FALSE                5  0.25000000 1979        1979-10-13
8           FALSE               11  0.52380952 2013        2013-09-28
9           FALSE               21  1.00000000 2014        2014-09-27
10          FALSE               21  1.00000000 2015        2015-10-03
11          FALSE               21  1.00000000 2016        2016-10-01
12          FALSE               18  1.00000000 2019        2019-09-28
13          FALSE               17  1.00000000 2020        2020-10-03
14          FALSE               20  1.00000000 1995        1995-09-30
15          FALSE                3  0.15000000 1996        1996-09-28
16          FALSE                8  0.66666667 2007        2007-09-29
17          FALSE               22  1.00000000 2008        2008-09-13
18          FALSE               15  0.78947368 2005        2005-10-01
19          FALSE               20  1.00000000 2006        2006-09-30
20          FALSE               12  1.00000000 2007        2007-09-29
21          FALSE               22  1.00000000 2008        2008-09-13
22          FALSE               22  1.00000000 2009        2009-09-26
23          FALSE               22  1.00000000 2010        2010-09-25
24          FALSE               22  1.00000000 2011        2011-09-24
25          FALSE               21  1.00000000 2013        2013-09-28
26          FALSE               21  1.00000000 2013        2013-09-28
27          FALSE               10  0.76923077 1980        1980-11-15
28          FALSE               12  0.66666667 1985        1985-11-09
29          FALSE               15  0.68181818 2008        2008-09-13
30          FALSE               20  1.00000000 1995        1995-09-30
31          FALSE               18  1.00000000 1985        1985-11-09
32          FALSE               21  1.00000000 2016        2016-10-01
33          FALSE               21  1.00000000 2017        2017-09-30
34          FALSE               21  1.00000000 2018        2018-09-29
35          FALSE               18  1.00000000 2019        2019-09-28
36          FALSE               17  1.00000000 2020        2020-10-03
37          FALSE               18  1.00000000 1985        1985-11-09
38          FALSE               20  1.00000000 2003        2003-10-04
39          FALSE               20  1.00000000 2004        2004-10-02
40          FALSE               19  1.00000000 2005        2005-10-01
41          FALSE               20  1.00000000 2006        2006-09-30
42          FALSE               12  1.00000000 2007        2007-09-29
43          FALSE               22  1.00000000 2008        2008-09-13
44          FALSE               22  1.00000000 2009        2009-09-26
45          FALSE               22  1.00000000 2010        2010-09-25
46          FALSE               22  1.00000000 2011        2011-09-24
47          FALSE               21  1.00000000 2012        2012-09-15
48          FALSE               21  1.00000000 2013        2013-09-28
49          FALSE               21  1.00000000 2014        2014-09-27
50          FALSE               21  1.00000000 2015        2015-10-03
51          FALSE               21  1.00000000 2016        2016-10-01
52          FALSE               21  1.00000000 2017        2017-09-30
53          FALSE               21  1.00000000 2018        2018-09-29
54          FALSE               18  1.00000000 2019        2019-09-28
55          FALSE               17  1.00000000 2020        2020-10-03
56          FALSE               18  1.00000000 1985        1985-11-09
57          FALSE               16  0.80000000 1990        1990-09-29
58          FALSE               20  1.00000000 1991        1991-09-28
59          FALSE               20  1.00000000 1992        1992-09-26
60          FALSE               20  1.00000000 1993        1993-09-25
61          FALSE                3  0.15000000 2004        2004-10-02
62          FALSE               19  1.00000000 2005        2005-10-01
63          FALSE               20  1.00000000 2006        2006-09-30
64          FALSE               12  1.00000000 2007        2007-09-29
65          FALSE               22  1.00000000 2008        2008-09-13
66          FALSE               22  1.00000000 2009        2009-09-26
67          FALSE               22  1.00000000 2010        2010-09-25
68          FALSE               22  1.00000000 2011        2011-09-24
69          FALSE               21  1.00000000 2012        2012-09-15
70          FALSE               21  1.00000000 2012        2012-09-15
71           TRUE               21  1.00000000 2013        2013-09-28
72          FALSE               21  1.00000000 2014        2014-09-27
73          FALSE               21  1.00000000 2015        2015-10-03
74          FALSE               21  1.00000000 2016        2016-10-01
75          FALSE               21  1.00000000 2017        2017-09-30
76          FALSE               21  1.00000000 2018        2018-09-29
77          FALSE               18  1.00000000 2019        2019-09-28
78          FALSE               17  1.00000000 2020        2020-10-03
79          FALSE                6  0.30000000 1988        1988-10-08
80          FALSE               17  1.00000000 1984        1984-10-06
81          FALSE               16  0.80000000 1990        1990-09-29
82          FALSE               20  1.00000000 1991        1991-09-28
83          FALSE               20  1.00000000 1992        1992-09-26
84          FALSE               20  1.00000000 1993        1993-09-25
85          FALSE               20  1.00000000 1994        1994-09-24
86          FALSE               20  1.00000000 1995        1995-09-30
87          FALSE               20  1.00000000 1991        1991-09-28
88          FALSE               20  1.00000000 1992        1992-09-26
89          FALSE               22  1.00000000 2009        2009-09-26
90          FALSE               18  0.90000000 1993        1993-09-25
91          FALSE               17  1.00000000 1984        1984-10-06
92          FALSE               20  1.00000000 1979        1979-10-13
93          FALSE               10  0.58823529 1984        1984-10-06
94          FALSE                7  0.35000000 1994        1994-09-24
95          FALSE               20  1.00000000 1995        1995-09-30
96          FALSE               20  1.00000000 1996        1996-09-28
97          FALSE               20  1.00000000 1997        1997-09-27
98          FALSE               19  1.00000000 1998        1998-09-26
99          FALSE               20  1.00000000 1999        1999-10-02
100         FALSE               12  0.60000000 2000        2000-10-07
101         FALSE               16  0.80000000 1979        1979-10-13
102         FALSE               17  0.85000000 1990        1990-09-29
103         FALSE               20  1.00000000 1991        1991-09-28
104         FALSE               20  1.00000000 1992        1992-09-26
105         FALSE               20  1.00000000 1993        1993-09-25
106         FALSE                5  0.25000000 1979        1979-10-13
107         FALSE               19  1.00000000 1998        1998-09-26
108         FALSE               20  1.00000000 1999        1999-10-02
109         FALSE               20  1.00000000 2000        2000-10-07
110         FALSE               20  1.00000000 2001        2001-09-29
111         FALSE               20  1.00000000 2002        2002-10-05
112         FALSE               20  1.00000000 2003        2003-10-04
113         FALSE               20  1.00000000 2004        2004-10-02
114          TRUE               19  1.00000000 2005        2005-10-01
115         FALSE                9  0.45000000 1990        1990-09-29
116         FALSE               20  1.00000000 1991        1991-09-28
117         FALSE               20  1.00000000 1992        1992-09-26
118         FALSE               20  1.00000000 1993        1993-09-25
119         FALSE               20  1.00000000 1994        1994-09-24
120         FALSE               19  1.00000000 2005        2005-10-01
121         FALSE               20  1.00000000 2006        2006-09-30
122         FALSE               12  1.00000000 2007        2007-09-29
123         FALSE               22  1.00000000 2008        2008-09-13
124         FALSE               22  1.00000000 2009        2009-09-26
125         FALSE               22  1.00000000 2010        2010-09-25
126         FALSE               22  1.00000000 2011        2011-09-24
127         FALSE                3  0.15000000 1999        1999-10-02
128         FALSE               20  1.00000000 2000        2000-10-07
129         FALSE               20  1.00000000 2001        2001-09-29
130         FALSE               20  1.00000000 2002        2002-10-05
131         FALSE               20  1.00000000 2003        2003-10-04
132         FALSE               20  1.00000000 2004        2004-10-02
133         FALSE               19  1.00000000 2005        2005-10-01
134         FALSE               20  1.00000000 2006        2006-09-30
135         FALSE                4  0.33333333 2007        2007-09-29
136         FALSE               21  1.00000000 2015        2015-10-03
137         FALSE                1  0.07692308 1980        1980-11-15
138         FALSE               20  1.00000000 1981        1981-10-03
139          TRUE               13  1.00000000 1980        1980-11-15
140         FALSE               20  1.00000000 1990        1990-09-29
141         FALSE               20  1.00000000 1991        1991-09-28
142         FALSE               20  1.00000000 1992        1992-09-26
143         FALSE               21  1.00000000 2012        2012-09-15
144         FALSE               13  1.00000000 1980        1980-11-15
145         FALSE               20  1.00000000 2004        2004-10-02
146         FALSE               20  1.00000000 2001        2001-09-29
147         FALSE               20  1.00000000 2002        2002-10-05
148         FALSE               10  0.50000000 2003        2003-10-04
149         FALSE               21  1.00000000 2017        2017-09-30
150         FALSE               21  1.00000000 2018        2018-09-29
151         FALSE               18  1.00000000 2019        2019-09-28
152         FALSE               17  1.00000000 2020        2020-10-03
153         FALSE               24  1.00000000 1975        1975-10-11
154         FALSE               22  1.00000000 1976        1976-09-18
155         FALSE               20  1.00000000 1977        1977-09-24
156         FALSE               20  1.00000000 1978        1978-10-07
157         FALSE               20  1.00000000 1979        1979-10-13
158         FALSE               20  1.00000000 1995        1995-09-30
159         FALSE               20  1.00000000 1996        1996-09-28
160          TRUE               20  1.00000000 1997        1997-09-27
161          TRUE               19  1.00000000 1998        1998-09-26
162          TRUE               20  1.00000000 1999        1999-10-02
163         FALSE               18  1.00000000 1985        1985-11-09
164         FALSE                1  0.07692308 1980        1980-11-15
165         FALSE               20  1.00000000 2001        2001-09-29
166         FALSE               20  1.00000000 2002        2002-10-05
167         FALSE               20  1.00000000 2003        2003-10-04
168          TRUE               20  1.00000000 2004        2004-10-02
169          TRUE               19  1.00000000 2005        2005-10-01
170          TRUE               20  1.00000000 2006        2006-09-30
171          TRUE               12  1.00000000 2007        2007-09-29
172          TRUE               11  0.50000000 2008        2008-09-13
173         FALSE               13  1.00000000 1980        1980-11-15
174         FALSE               20  1.00000000 1981        1981-10-03
175         FALSE               20  1.00000000 1982        1982-09-25
176         FALSE               19  1.00000000 1983        1983-10-08
177         FALSE               22  1.00000000 2010        2010-09-25
178         FALSE               22  1.00000000 2011        2011-09-24
179         FALSE               21  1.00000000 2012        2012-09-15
180         FALSE               21  1.00000000 2013        2013-09-28
181         FALSE               21  1.00000000 2014        2014-09-27
182         FALSE               21  1.00000000 2015        2015-10-03
183         FALSE               22  1.00000000 2009        2009-09-26
184         FALSE               22  1.00000000 2010        2010-09-25
185         FALSE               22  1.00000000 2011        2011-09-24
186         FALSE               21  1.00000000 2012        2012-09-15
187         FALSE               21  1.00000000 2013        2013-09-28
188         FALSE               19  1.00000000 1998        1998-09-26
189         FALSE               20  1.00000000 1999        1999-10-02
190         FALSE               20  1.00000000 2000        2000-10-07
191         FALSE                8  0.40000000 2001        2001-09-29
192         FALSE               20  1.00000000 2002        2002-10-05
193         FALSE               20  1.00000000 2003        2003-10-04
194         FALSE               20  1.00000000 2004        2004-10-02
195         FALSE               19  1.00000000 2005        2005-10-01
196         FALSE               20  1.00000000 1995        1995-09-30
197         FALSE               20  1.00000000 1996        1996-09-28
198         FALSE               20  1.00000000 1997        1997-09-27
199         FALSE               19  1.00000000 1998        1998-09-26
200         FALSE               20  1.00000000 1999        1999-10-02
201         FALSE                4  0.16666667 1975        1975-10-11
202         FALSE               21  1.00000000 2013        2013-09-28
203         FALSE               21  1.00000000 2018        2018-09-29
204         FALSE               18  1.00000000 2019        2019-09-28
205         FALSE               17  1.00000000 2020        2020-10-03
206         FALSE               21  1.00000000 2017        2017-09-30
207         FALSE               20  1.00000000 1979        1979-10-13
208         FALSE               18  1.00000000 1985        1985-11-09
209         FALSE               24  1.00000000 1975        1975-10-11
210         FALSE               22  1.00000000 1976        1976-09-18
211         FALSE               20  1.00000000 1977        1977-09-24
212         FALSE               20  1.00000000 1978        1978-10-07
213         FALSE               20  1.00000000 1979        1979-10-13
214         FALSE               20  1.00000000 1986        1986-10-11
215         FALSE               13  1.00000000 1987        1987-10-17
216         FALSE               20  1.00000000 1988        1988-10-08
217         FALSE               20  1.00000000 1989        1989-09-30
218         FALSE               20  1.00000000 1990        1990-09-29
219          TRUE               20  1.00000000 1991        1991-09-28
220          TRUE               20  1.00000000 1992        1992-09-26
221          TRUE               20  1.00000000 1993        1993-09-25
222         FALSE               20  1.00000000 1994        1994-09-24
223         FALSE               11  0.55000000 1988        1988-10-08
224         FALSE               20  1.00000000 1989        1989-09-30
225         FALSE               20  1.00000000 1990        1990-09-29
226         FALSE               20  1.00000000 1991        1991-09-28
227         FALSE               20  1.00000000 1992        1992-09-26
228         FALSE               20  1.00000000 1993        1993-09-25
229         FALSE               11  0.55000000 1994        1994-09-24
230         FALSE               12  0.54545455 1976        1976-09-18
231         FALSE               20  1.00000000 1977        1977-09-24
232          TRUE               20  1.00000000 1978        1978-10-07
233          TRUE               20  1.00000000 1979        1979-10-13
234         FALSE               10  0.76923077 1980        1980-11-15
235         FALSE               20  1.00000000 1981        1981-10-03
236         FALSE               20  1.00000000 1982        1982-09-25
237         FALSE               14  0.73684211 1983        1983-10-08
238         FALSE               22  1.00000000 2008        2008-09-13
239         FALSE               22  1.00000000 2009        2009-09-26
240         FALSE               22  1.00000000 2010        2010-09-25
241         FALSE               22  1.00000000 2011        2011-09-24
242         FALSE               21  1.00000000 2012        2012-09-15
243         FALSE               21  1.00000000 2013        2013-09-28
244         FALSE               21  1.00000000 2014        2014-09-27
245         FALSE               21  1.00000000 2015        2015-10-03
246         FALSE               21  1.00000000 2016        2016-10-01
247         FALSE               24  1.00000000 1975        1975-10-11
248         FALSE               22  1.00000000 1976        1976-09-18
249         FALSE               20  1.00000000 1977        1977-09-24
250         FALSE               20  1.00000000 1978        1978-10-07
251         FALSE               20  1.00000000 1979        1979-10-13
252         FALSE               20  1.00000000 1996        1996-09-28
253         FALSE               20  1.00000000 1997        1997-09-27
254         FALSE               19  1.00000000 1998        1998-09-26
255         FALSE               20  1.00000000 1999        1999-10-02
256         FALSE               20  1.00000000 2000        2000-10-07
257         FALSE               20  1.00000000 2001        2001-09-29
258         FALSE               20  1.00000000 2002        2002-10-05
259         FALSE               21  1.00000000 2013        2013-09-28
260         FALSE               21  1.00000000 2014        2014-09-27
261         FALSE               21  1.00000000 2015        2015-10-03
262         FALSE               21  1.00000000 2016        2016-10-01
263         FALSE               21  1.00000000 2017        2017-09-30
264         FALSE               21  1.00000000 2018        2018-09-29
265         FALSE               18  1.00000000 2019        2019-09-28
266         FALSE               17  1.00000000 2020        2020-10-03
267         FALSE               18  0.90000000 1993        1993-09-25
268         FALSE               20  1.00000000 1994        1994-09-24
269         FALSE               21  1.00000000 2016        2016-10-01
270         FALSE               21  1.00000000 2017        2017-09-30
271         FALSE               21  1.00000000 2018        2018-09-29
272         FALSE               18  1.00000000 2019        2019-09-28
273         FALSE               17  1.00000000 2020        2020-10-03
274         FALSE               20  1.00000000 2003        2003-10-04
275         FALSE               20  1.00000000 2004        2004-10-02
276         FALSE               19  1.00000000 2005        2005-10-01
277         FALSE               20  1.00000000 2000        2000-10-07
278          TRUE               18  1.00000000 1985        1985-11-09
279          TRUE               20  1.00000000 1986        1986-10-11
280          TRUE               13  1.00000000 1987        1987-10-17
281          TRUE               20  1.00000000 1988        1988-10-08
282          TRUE               20  1.00000000 1989        1989-09-30
283          TRUE               20  1.00000000 1990        1990-09-29
284         FALSE               21  1.00000000 2013        2013-09-28
285         FALSE               20  1.00000000 2001        2001-09-29
286         FALSE               20  1.00000000 2002        2002-10-05
287         FALSE               20  1.00000000 2003        2003-10-04
288         FALSE               20  1.00000000 2004        2004-10-02
289         FALSE               19  1.00000000 2005        2005-10-01
290          TRUE               20  1.00000000 2006        2006-09-30
291          TRUE               12  1.00000000 2007        2007-09-29
292          TRUE               22  1.00000000 2008        2008-09-13
293          TRUE               22  1.00000000 2009        2009-09-26
294          TRUE               22  1.00000000 2010        2010-09-25
295          TRUE               22  1.00000000 2011        2011-09-24
296          TRUE               21  1.00000000 2012        2012-09-15
297          TRUE               13  0.61904762 2013        2013-09-28
298         FALSE                1  0.07692308 1980        1980-11-15
299         FALSE                9  0.45000000 1990        1990-09-29
300         FALSE               20  1.00000000 1991        1991-09-28
301         FALSE               20  1.00000000 1992        1992-09-26
302         FALSE               20  1.00000000 1993        1993-09-25
303         FALSE               20  1.00000000 1994        1994-09-24
304         FALSE               20  1.00000000 1995        1995-09-30
305         FALSE               20  1.00000000 1996        1996-09-28
306         FALSE               20  1.00000000 1997        1997-09-27
307         FALSE               19  1.00000000 1998        1998-09-26
308         FALSE               20  1.00000000 1999        1999-10-02
309         FALSE                5  0.22727273 2011        2011-09-24
310         FALSE               21  1.00000000 2012        2012-09-15
311         FALSE               21  1.00000000 2013        2013-09-28
312         FALSE               21  1.00000000 2014        2014-09-27
313         FALSE               21  1.00000000 2015        2015-10-03
314         FALSE               21  1.00000000 2016        2016-10-01
315         FALSE               21  1.00000000 2017        2017-09-30
316         FALSE               21  1.00000000 2018        2018-09-29
317         FALSE               18  1.00000000 2019        2019-09-28
318         FALSE               17  1.00000000 2020        2020-10-03
319         FALSE               11  0.55000000 1994        1994-09-24
320         FALSE               20  1.00000000 1995        1995-09-30
321         FALSE               20  1.00000000 1996        1996-09-28
322         FALSE                6  0.30000000 1993        1993-09-25
323         FALSE               20  1.00000000 1994        1994-09-24
324          TRUE               13  1.00000000 1980        1980-11-15
325         FALSE               19  0.95000000 1993        1993-09-25
326          TRUE               20  1.00000000 1994        1994-09-24
327          TRUE               20  1.00000000 1995        1995-09-30
328          TRUE               20  1.00000000 1996        1996-09-28
329          TRUE               16  0.80000000 1997        1997-09-27
330         FALSE               18  1.00000000 1985        1985-11-09
331         FALSE               20  1.00000000 1986        1986-10-11
332         FALSE               13  1.00000000 1987        1987-10-17
333         FALSE               20  1.00000000 1988        1988-10-08
334         FALSE               20  1.00000000 1989        1989-09-30
335         FALSE               20  1.00000000 1982        1982-09-25
336         FALSE               19  1.00000000 1983        1983-10-08
337         FALSE               17  1.00000000 1984        1984-10-06
338         FALSE               10  0.76923077 1980        1980-11-15
339         FALSE               20  1.00000000 1982        1982-09-25
340         FALSE               19  1.00000000 1983        1983-10-08
341         FALSE               17  1.00000000 1984        1984-10-06
342         FALSE               20  1.00000000 1995        1995-09-30
343         FALSE               22  1.00000000 2010        2010-09-25
344         FALSE               22  1.00000000 2011        2011-09-24
345         FALSE               21  1.00000000 2012        2012-09-15
346         FALSE               21  1.00000000 2013        2013-09-28
347         FALSE               21  1.00000000 2014        2014-09-27
348         FALSE               21  1.00000000 2015        2015-10-03
349         FALSE               20  1.00000000 1994        1994-09-24
350         FALSE                1  0.07692308 1980        1980-11-15
351         FALSE               20  1.00000000 1981        1981-10-03
352         FALSE               20  1.00000000 1982        1982-09-25
353         FALSE               19  1.00000000 1983        1983-10-08
354         FALSE                6  0.30000000 1995        1995-09-30
355         FALSE               20  1.00000000 1996        1996-09-28
356         FALSE               20  1.00000000 1997        1997-09-27
357         FALSE               19  1.00000000 1998        1998-09-26
358         FALSE               20  1.00000000 1999        1999-10-02
359         FALSE               20  1.00000000 2000        2000-10-07
360         FALSE               20  1.00000000 2001        2001-09-29
361         FALSE               20  1.00000000 2002        2002-10-05
362          TRUE                8  0.38095238 2013        2013-09-28
363          TRUE               21  1.00000000 2014        2014-09-27
364          TRUE               21  1.00000000 2015        2015-10-03
365          TRUE               21  1.00000000 2016        2016-10-01
366          TRUE               21  1.00000000 2017        2017-09-30
367          TRUE               21  1.00000000 2018        2018-09-29
368          TRUE               18  1.00000000 2019        2019-09-28
369          TRUE               17  1.00000000 2020        2020-10-03
370         FALSE               18  0.85714286 2014        2014-09-27
371         FALSE               21  1.00000000 2015        2015-10-03
372         FALSE               21  1.00000000 2016        2016-10-01
373         FALSE               21  1.00000000 2017        2017-09-30
374         FALSE               21  1.00000000 2018        2018-09-29
375         FALSE               17  1.00000000 2020        2020-10-03
376         FALSE               20  1.00000000 1986        1986-10-11
377         FALSE               13  1.00000000 1987        1987-10-17
378         FALSE               20  1.00000000 1988        1988-10-08
379         FALSE               20  1.00000000 1989        1989-09-30
380         FALSE               20  1.00000000 1990        1990-09-29
381         FALSE               20  1.00000000 1991        1991-09-28
382         FALSE               15  0.75000000 1991        1991-09-28
383         FALSE               20  1.00000000 1992        1992-09-26
384         FALSE               20  1.00000000 1993        1993-09-25
385         FALSE                9  0.69230769 1980        1980-11-15
386         FALSE               20  1.00000000 1986        1986-10-11
387         FALSE               13  1.00000000 1987        1987-10-17
388         FALSE               20  1.00000000 1988        1988-10-08
389         FALSE               20  1.00000000 1989        1989-09-30
390         FALSE               20  1.00000000 1990        1990-09-29
391         FALSE               17  1.00000000 2020        2020-10-03
392         FALSE               20  1.00000000 1986        1986-10-11
393         FALSE               13  1.00000000 1987        1987-10-17
394         FALSE               20  1.00000000 1988        1988-10-08
395         FALSE               20  1.00000000 1989        1989-09-30
396         FALSE               20  1.00000000 1990        1990-09-29
397         FALSE               20  1.00000000 1991        1991-09-28
398         FALSE               20  1.00000000 1992        1992-09-26
399         FALSE               20  1.00000000 1993        1993-09-25
400         FALSE               20  1.00000000 1995        1995-09-30
401         FALSE               20  1.00000000 1996        1996-09-28
402         FALSE               20  1.00000000 1997        1997-09-27
403         FALSE               19  1.00000000 1998        1998-09-26
404         FALSE               20  1.00000000 1999        1999-10-02
405         FALSE               20  1.00000000 2000        2000-10-07
406         FALSE               20  1.00000000 2001        2001-09-29
407         FALSE               20  1.00000000 2002        2002-10-05
408         FALSE               20  1.00000000 2003        2003-10-04
409         FALSE               20  1.00000000 2004        2004-10-02
410         FALSE               19  1.00000000 2005        2005-10-01
411         FALSE               20  1.00000000 2006        2006-09-30
412         FALSE               12  1.00000000 2007        2007-09-29
413         FALSE               22  1.00000000 2008        2008-09-13
414         FALSE               17  1.00000000 1984        1984-10-06
415          TRUE               20  1.00000000 1982        1982-09-25
416          TRUE               19  1.00000000 1983        1983-10-08
417         FALSE               18  1.00000000 1985        1985-11-09
418         FALSE               19  1.00000000 2005        2005-10-01
419         FALSE               20  1.00000000 2006        2006-09-30
420         FALSE               12  1.00000000 2007        2007-09-29
421         FALSE               22  1.00000000 2008        2008-09-13
422         FALSE               22  1.00000000 2009        2009-09-26
423         FALSE               22  1.00000000 2010        2010-09-25
424         FALSE               22  1.00000000 2011        2011-09-24
425         FALSE               21  1.00000000 2012        2012-09-15
426          TRUE               17  1.00000000 1984        1984-10-06
427          TRUE               20  1.00000000 1981        1981-10-03
428         FALSE               20  1.00000000 1982        1982-09-25
429         FALSE               19  1.00000000 1983        1983-10-08
430         FALSE               17  1.00000000 1984        1984-10-06
431         FALSE               13  1.00000000 1980        1980-11-15
432         FALSE               20  1.00000000 1996        1996-09-28
433         FALSE               20  1.00000000 1997        1997-09-27
434         FALSE               19  1.00000000 1998        1998-09-26
435         FALSE               20  1.00000000 1999        1999-10-02
436         FALSE               20  1.00000000 2000        2000-10-07
437         FALSE               20  1.00000000 2001        2001-09-29
438         FALSE               14  0.70000000 1994        1994-09-24
439         FALSE               21  1.00000000 2017        2017-09-30
440         FALSE               21  1.00000000 2018        2018-09-29
441         FALSE               18  1.00000000 2019        2019-09-28
442         FALSE               17  1.00000000 2020        2020-10-03
443         FALSE               20  1.00000000 1977        1977-09-24
444         FALSE               20  1.00000000 1978        1978-10-07
445         FALSE               14  0.70000000 1979        1979-10-13
446         FALSE                6  0.33333333 1985        1985-11-09
447         FALSE               20  1.00000000 1988        1988-10-08
448         FALSE               20  1.00000000 1989        1989-09-30
449         FALSE               20  1.00000000 1990        1990-09-29
450         FALSE               20  1.00000000 1991        1991-09-28
451         FALSE               20  1.00000000 1992        1992-09-26
452         FALSE               20  1.00000000 1993        1993-09-25
453         FALSE               20  1.00000000 1994        1994-09-24
454         FALSE               20  1.00000000 2002        2002-10-05
455         FALSE               20  1.00000000 2003        2003-10-04
456         FALSE               20  1.00000000 2004        2004-10-02
457         FALSE               19  1.00000000 2005        2005-10-01
458         FALSE               20  1.00000000 2006        2006-09-30
459         FALSE               12  1.00000000 2007        2007-09-29
460         FALSE               22  1.00000000 2008        2008-09-13
461         FALSE               22  1.00000000 2009        2009-09-26
462         FALSE               18  1.00000000 2019        2019-09-28
463         FALSE               17  1.00000000 2020        2020-10-03
464          TRUE               20  1.00000000 2000        2000-10-07
465          TRUE               20  1.00000000 2001        2001-09-29
466          TRUE               20  1.00000000 2002        2002-10-05
467          TRUE               20  1.00000000 2003        2003-10-04
468          TRUE               20  1.00000000 2004        2004-10-02
469          TRUE               19  1.00000000 2005        2005-10-01
470         FALSE               20  1.00000000 1995        1995-09-30
471         FALSE               20  1.00000000 1996        1996-09-28
472         FALSE               20  1.00000000 1997        1997-09-27
473         FALSE               19  1.00000000 1998        1998-09-26
474         FALSE               20  1.00000000 1999        1999-10-02
475         FALSE               20  1.00000000 2000        2000-10-07
476         FALSE               20  1.00000000 2001        2001-09-29
477         FALSE               20  1.00000000 1990        1990-09-29
478         FALSE               20  1.00000000 1991        1991-09-28
479         FALSE               20  1.00000000 1992        1992-09-26
480         FALSE               20  1.00000000 1993        1993-09-25
481         FALSE               20  1.00000000 1994        1994-09-24
482         FALSE               20  1.00000000 1991        1991-09-28
483         FALSE               19  1.00000000 1998        1998-09-26
484         FALSE               20  1.00000000 1999        1999-10-02
485          TRUE               20  1.00000000 2000        2000-10-07
486          TRUE               20  1.00000000 2001        2001-09-29
487          TRUE               20  1.00000000 2002        2002-10-05
488          TRUE               20  1.00000000 2003        2003-10-04
489         FALSE               20  1.00000000 1994        1994-09-24
490         FALSE               15  0.68181818 2008        2008-09-13
491         FALSE               22  1.00000000 2009        2009-09-26
492         FALSE               22  1.00000000 2010        2010-09-25
493         FALSE               22  1.00000000 2011        2011-09-24
494         FALSE               20  1.00000000 2001        2001-09-29
495         FALSE               20  1.00000000 2002        2002-10-05
496          TRUE               20  1.00000000 1981        1981-10-03
497         FALSE               18  1.00000000 1985        1985-11-09
498         FALSE               20  1.00000000 1986        1986-10-11
499         FALSE               13  1.00000000 1987        1987-10-17
500         FALSE               20  1.00000000 1988        1988-10-08
501         FALSE               20  1.00000000 1989        1989-09-30
502         FALSE                1  0.07692308 1980        1980-11-15
503         FALSE               20  1.00000000 1981        1981-10-03
504         FALSE               20  1.00000000 1982        1982-09-25
505         FALSE               19  1.00000000 1983        1983-10-08
506         FALSE               18  0.90000000 1999        1999-10-02
507         FALSE               20  1.00000000 2000        2000-10-07
508         FALSE               20  1.00000000 2001        2001-09-29
509         FALSE               20  1.00000000 2002        2002-10-05
510         FALSE               20  1.00000000 2003        2003-10-04
511         FALSE               20  1.00000000 2004        2004-10-02
512         FALSE               19  1.00000000 2005        2005-10-01
513         FALSE               12  0.60000000 1979        1979-10-13
514          TRUE               20  1.00000000 1981        1981-10-03
515         FALSE               18  1.00000000 1985        1985-11-09
516         FALSE               12  0.60000000 1979        1979-10-13
517         FALSE               17  1.00000000 2020        2020-10-03
518         FALSE               13  1.00000000 1980        1980-11-15
519         FALSE               21  1.00000000 2016        2016-10-01
520         FALSE               21  1.00000000 2017        2017-09-30
521         FALSE               21  1.00000000 2018        2018-09-29
522         FALSE               18  1.00000000 2019        2019-09-28
523         FALSE               17  1.00000000 2020        2020-10-03
524         FALSE               20  1.00000000 1977        1977-09-24
525         FALSE               20  1.00000000 1978        1978-10-07
526         FALSE               16  0.80000000 1979        1979-10-13
527         FALSE               21  1.00000000 2014        2014-09-27
528         FALSE               21  1.00000000 2015        2015-10-03
529         FALSE               21  1.00000000 2016        2016-10-01
530         FALSE               21  1.00000000 2017        2017-09-30
531         FALSE               21  1.00000000 2018        2018-09-29
532         FALSE               18  1.00000000 2019        2019-09-28
533         FALSE               17  1.00000000 2020        2020-10-03
534         FALSE               18  1.00000000 1985        1985-11-09
535         FALSE               24  1.00000000 1975        1975-10-11
536          TRUE               22  1.00000000 1976        1976-09-18
537          TRUE               20  1.00000000 1977        1977-09-24
538          TRUE               20  1.00000000 1978        1978-10-07
539          TRUE               20  1.00000000 1979        1979-10-13
540         FALSE               17  1.00000000 1984        1984-10-06
541         FALSE                1  0.04166667 1975        1975-10-11
542         FALSE               20  1.00000000 1991        1991-09-28
543         FALSE               20  1.00000000 1992        1992-09-26
544         FALSE               20  1.00000000 1993        1993-09-25
545         FALSE               20  1.00000000 1994        1994-09-24
546          TRUE               21  1.00000000 2014        2014-09-27
547          TRUE               21  1.00000000 2015        2015-10-03
548          TRUE               21  1.00000000 2016        2016-10-01
549          TRUE               21  1.00000000 2017        2017-09-30
550          TRUE               21  1.00000000 2018        2018-09-29
551          TRUE               18  1.00000000 2019        2019-09-28
552          TRUE               17  1.00000000 2020        2020-10-03
553          TRUE               24  1.00000000 1975        1975-10-11
554          TRUE                6  0.27272727 1976        1976-09-18
555         FALSE               20  1.00000000 1986        1986-10-11
556         FALSE               13  1.00000000 1987        1987-10-17
557         FALSE               20  1.00000000 1988        1988-10-08
558         FALSE               20  1.00000000 1989        1989-09-30
559         FALSE               20  1.00000000 1990        1990-09-29
560         FALSE               20  1.00000000 1991        1991-09-28
561         FALSE               12  0.60000000 1992        1992-09-26
562         FALSE               15  0.75000000 1991        1991-09-28
563         FALSE               21  1.00000000 2012        2012-09-15
564         FALSE               21  1.00000000 2013        2013-09-28
565         FALSE               21  1.00000000 2014        2014-09-27
566         FALSE               21  1.00000000 2015        2015-10-03
567         FALSE               21  1.00000000 2016        2016-10-01
568         FALSE               21  1.00000000 2017        2017-09-30
569         FALSE               21  1.00000000 2018        2018-09-29
570         FALSE               18  1.00000000 2019        2019-09-28
571         FALSE               17  1.00000000 2020        2020-10-03
572         FALSE               22  1.00000000 2010        2010-09-25
573         FALSE               12  0.54545455 2011        2011-09-24
574         FALSE               20  1.00000000 1995        1995-09-30
575         FALSE               20  1.00000000 1996        1996-09-28
576         FALSE               20  1.00000000 1997        1997-09-27
577         FALSE               21  1.00000000 2013        2013-09-28
578         FALSE               21  1.00000000 2014        2014-09-27
579         FALSE               21  1.00000000 2015        2015-10-03
580         FALSE               21  1.00000000 2016        2016-10-01
581         FALSE               21  1.00000000 2017        2017-09-30
582         FALSE               21  1.00000000 2018        2018-09-29
583         FALSE               18  1.00000000 2019        2019-09-28
584         FALSE               17  1.00000000 2020        2020-10-03
585         FALSE               24  1.00000000 1975        1975-10-11
586         FALSE               22  1.00000000 1976        1976-09-18
587         FALSE               20  1.00000000 1977        1977-09-24
588         FALSE               20  1.00000000 1978        1978-10-07
589         FALSE               19  1.00000000 1983        1983-10-08
590         FALSE               17  1.00000000 1984        1984-10-06
591         FALSE               22  1.00000000 2010        2010-09-25
592         FALSE               22  1.00000000 2011        2011-09-24
593         FALSE               21  1.00000000 2012        2012-09-15
594         FALSE               21  1.00000000 2013        2013-09-28
595         FALSE               21  1.00000000 2014        2014-09-27
596         FALSE               21  1.00000000 2015        2015-10-03
597         FALSE               21  1.00000000 2016        2016-10-01
598         FALSE                4  0.20000000 1994        1994-09-24
599         FALSE               12  0.60000000 1979        1979-10-13
600         FALSE               24  1.00000000 1975        1975-10-11
601         FALSE               22  1.00000000 1976        1976-09-18
602          TRUE               20  1.00000000 1977        1977-09-24
603         FALSE               20  1.00000000 1978        1978-10-07
604         FALSE               20  1.00000000 2002        2002-10-05
605         FALSE               20  1.00000000 2003        2003-10-04
606         FALSE               20  1.00000000 2004        2004-10-02
607         FALSE               19  1.00000000 2005        2005-10-01
608         FALSE               20  1.00000000 2006        2006-09-30
609         FALSE               12  1.00000000 2007        2007-09-29
610         FALSE               22  1.00000000 2008        2008-09-13
611         FALSE               22  1.00000000 2009        2009-09-26
612         FALSE               22  1.00000000 2010        2010-09-25
613         FALSE               22  1.00000000 2011        2011-09-24
614         FALSE               21  1.00000000 2012        2012-09-15
    last_epid_season n_episodes_season
1         1986-05-24                18
2         1987-05-23                20
3         1988-02-27                13
4         1989-05-20                20
5         1990-05-19                20
6         1991-05-18                20
7         1980-05-24                20
8         2014-05-17                21
9         2015-05-16                21
10        2016-05-21                21
11        2017-05-20                21
12        2020-05-09                18
13        2021-04-10                17
14        1996-05-18                20
15        1997-05-17                20
16        2008-05-17                12
17        2009-05-16                22
18        2006-05-20                19
19        2007-05-19                20
20        2008-05-17                12
21        2009-05-16                22
22        2010-05-15                22
23        2011-05-21                22
24        2012-05-19                22
25        2014-05-17                21
26        2014-05-17                21
27        1981-04-11                13
28        1986-05-24                18
29        2009-05-16                22
30        1996-05-18                20
31        1986-05-24                18
32        2017-05-20                21
33        2018-05-19                21
34        2019-05-18                21
35        2020-05-09                18
36        2021-04-10                17
37        1986-05-24                18
38        2004-05-15                20
39        2005-05-21                20
40        2006-05-20                19
41        2007-05-19                20
42        2008-05-17                12
43        2009-05-16                22
44        2010-05-15                22
45        2011-05-21                22
46        2012-05-19                22
47        2013-05-18                21
48        2014-05-17                21
49        2015-05-16                21
50        2016-05-21                21
51        2017-05-20                21
52        2018-05-19                21
53        2019-05-18                21
54        2020-05-09                18
55        2021-04-10                17
56        1986-05-24                18
57        1991-05-18                20
58        1992-05-16                20
59        1993-05-15                20
60        1994-05-14                20
61        2005-05-21                20
62        2006-05-20                19
63        2007-05-19                20
64        2008-05-17                12
65        2009-05-16                22
66        2010-05-15                22
67        2011-05-21                22
68        2012-05-19                22
69        2013-05-18                21
70        2013-05-18                21
71        2014-05-17                21
72        2015-05-16                21
73        2016-05-21                21
74        2017-05-20                21
75        2018-05-19                21
76        2019-05-18                21
77        2020-05-09                18
78        2021-04-10                17
79        1989-05-20                20
80        1985-04-13                17
81        1991-05-18                20
82        1992-05-16                20
83        1993-05-15                20
84        1994-05-14                20
85        1995-05-13                20
86        1996-05-18                20
87        1992-05-16                20
88        1993-05-15                20
89        2010-05-15                22
90        1994-05-14                20
91        1985-04-13                17
92        1980-05-24                20
93        1985-04-13                17
94        1995-05-13                20
95        1996-05-18                20
96        1997-05-17                20
97        1998-05-09                20
98        1999-05-15                19
99        2000-05-20                20
100       2001-05-19                20
101       1980-05-24                20
102       1991-05-18                20
103       1992-05-16                20
104       1993-05-15                20
105       1994-05-14                20
106       1980-05-24                20
107       1999-05-15                19
108       2000-05-20                20
109       2001-05-19                20
110       2002-05-18                20
111       2003-05-17                20
112       2004-05-15                20
113       2005-05-21                20
114       2006-05-20                19
115       1991-05-18                20
116       1992-05-16                20
117       1993-05-15                20
118       1994-05-14                20
119       1995-05-13                20
120       2006-05-20                19
121       2007-05-19                20
122       2008-05-17                12
123       2009-05-16                22
124       2010-05-15                22
125       2011-05-21                22
126       2012-05-19                22
127       2000-05-20                20
128       2001-05-19                20
129       2002-05-18                20
130       2003-05-17                20
131       2004-05-15                20
132       2005-05-21                20
133       2006-05-20                19
134       2007-05-19                20
135       2008-05-17                12
136       2016-05-21                21
137       1981-04-11                13
138       1982-05-22                20
139       1981-04-11                13
140       1991-05-18                20
141       1992-05-16                20
142       1993-05-15                20
143       2013-05-18                21
144       1981-04-11                13
145       2005-05-21                20
146       2002-05-18                20
147       2003-05-17                20
148       2004-05-15                20
149       2018-05-19                21
150       2019-05-18                21
151       2020-05-09                18
152       2021-04-10                17
153       1976-07-31                24
154       1977-05-21                22
155       1978-05-20                20
156       1979-05-26                20
157       1980-05-24                20
158       1996-05-18                20
159       1997-05-17                20
160       1998-05-09                20
161       1999-05-15                19
162       2000-05-20                20
163       1986-05-24                18
164       1981-04-11                13
165       2002-05-18                20
166       2003-05-17                20
167       2004-05-15                20
168       2005-05-21                20
169       2006-05-20                19
170       2007-05-19                20
171       2008-05-17                12
172       2009-05-16                22
173       1981-04-11                13
174       1982-05-22                20
175       1983-05-14                20
176       1984-05-12                19
177       2011-05-21                22
178       2012-05-19                22
179       2013-05-18                21
180       2014-05-17                21
181       2015-05-16                21
182       2016-05-21                21
183       2010-05-15                22
184       2011-05-21                22
185       2012-05-19                22
186       2013-05-18                21
187       2014-05-17                21
188       1999-05-15                19
189       2000-05-20                20
190       2001-05-19                20
191       2002-05-18                20
192       2003-05-17                20
193       2004-05-15                20
194       2005-05-21                20
195       2006-05-20                19
196       1996-05-18                20
197       1997-05-17                20
198       1998-05-09                20
199       1999-05-15                19
200       2000-05-20                20
201       1976-07-31                24
202       2014-05-17                21
203       2019-05-18                21
204       2020-05-09                18
205       2021-04-10                17
206       2018-05-19                21
207       1980-05-24                20
208       1986-05-24                18
209       1976-07-31                24
210       1977-05-21                22
211       1978-05-20                20
212       1979-05-26                20
213       1980-05-24                20
214       1987-05-23                20
215       1988-02-27                13
216       1989-05-20                20
217       1990-05-19                20
218       1991-05-18                20
219       1992-05-16                20
220       1993-05-15                20
221       1994-05-14                20
222       1995-05-13                20
223       1989-05-20                20
224       1990-05-19                20
225       1991-05-18                20
226       1992-05-16                20
227       1993-05-15                20
228       1994-05-14                20
229       1995-05-13                20
230       1977-05-21                22
231       1978-05-20                20
232       1979-05-26                20
233       1980-05-24                20
234       1981-04-11                13
235       1982-05-22                20
236       1983-05-14                20
237       1984-05-12                19
238       2009-05-16                22
239       2010-05-15                22
240       2011-05-21                22
241       2012-05-19                22
242       2013-05-18                21
243       2014-05-17                21
244       2015-05-16                21
245       2016-05-21                21
246       2017-05-20                21
247       1976-07-31                24
248       1977-05-21                22
249       1978-05-20                20
250       1979-05-26                20
251       1980-05-24                20
252       1997-05-17                20
253       1998-05-09                20
254       1999-05-15                19
255       2000-05-20                20
256       2001-05-19                20
257       2002-05-18                20
258       2003-05-17                20
259       2014-05-17                21
260       2015-05-16                21
261       2016-05-21                21
262       2017-05-20                21
263       2018-05-19                21
264       2019-05-18                21
265       2020-05-09                18
266       2021-04-10                17
267       1994-05-14                20
268       1995-05-13                20
269       2017-05-20                21
270       2018-05-19                21
271       2019-05-18                21
272       2020-05-09                18
273       2021-04-10                17
274       2004-05-15                20
275       2005-05-21                20
276       2006-05-20                19
277       2001-05-19                20
278       1986-05-24                18
279       1987-05-23                20
280       1988-02-27                13
281       1989-05-20                20
282       1990-05-19                20
283       1991-05-18                20
284       2014-05-17                21
285       2002-05-18                20
286       2003-05-17                20
287       2004-05-15                20
288       2005-05-21                20
289       2006-05-20                19
290       2007-05-19                20
291       2008-05-17                12
292       2009-05-16                22
293       2010-05-15                22
294       2011-05-21                22
295       2012-05-19                22
296       2013-05-18                21
297       2014-05-17                21
298       1981-04-11                13
299       1991-05-18                20
300       1992-05-16                20
301       1993-05-15                20
302       1994-05-14                20
303       1995-05-13                20
304       1996-05-18                20
305       1997-05-17                20
306       1998-05-09                20
307       1999-05-15                19
308       2000-05-20                20
309       2012-05-19                22
310       2013-05-18                21
311       2014-05-17                21
312       2015-05-16                21
313       2016-05-21                21
314       2017-05-20                21
315       2018-05-19                21
316       2019-05-18                21
317       2020-05-09                18
318       2021-04-10                17
319       1995-05-13                20
320       1996-05-18                20
321       1997-05-17                20
322       1994-05-14                20
323       1995-05-13                20
324       1981-04-11                13
325       1994-05-14                20
326       1995-05-13                20
327       1996-05-18                20
328       1997-05-17                20
329       1998-05-09                20
330       1986-05-24                18
331       1987-05-23                20
332       1988-02-27                13
333       1989-05-20                20
334       1990-05-19                20
335       1983-05-14                20
336       1984-05-12                19
337       1985-04-13                17
338       1981-04-11                13
339       1983-05-14                20
340       1984-05-12                19
341       1985-04-13                17
342       1996-05-18                20
343       2011-05-21                22
344       2012-05-19                22
345       2013-05-18                21
346       2014-05-17                21
347       2015-05-16                21
348       2016-05-21                21
349       1995-05-13                20
350       1981-04-11                13
351       1982-05-22                20
352       1983-05-14                20
353       1984-05-12                19
354       1996-05-18                20
355       1997-05-17                20
356       1998-05-09                20
357       1999-05-15                19
358       2000-05-20                20
359       2001-05-19                20
360       2002-05-18                20
361       2003-05-17                20
362       2014-05-17                21
363       2015-05-16                21
364       2016-05-21                21
365       2017-05-20                21
366       2018-05-19                21
367       2019-05-18                21
368       2020-05-09                18
369       2021-04-10                17
370       2015-05-16                21
371       2016-05-21                21
372       2017-05-20                21
373       2018-05-19                21
374       2019-05-18                21
375       2021-04-10                17
376       1987-05-23                20
377       1988-02-27                13
378       1989-05-20                20
379       1990-05-19                20
380       1991-05-18                20
381       1992-05-16                20
382       1992-05-16                20
383       1993-05-15                20
384       1994-05-14                20
385       1981-04-11                13
386       1987-05-23                20
387       1988-02-27                13
388       1989-05-20                20
389       1990-05-19                20
390       1991-05-18                20
391       2021-04-10                17
392       1987-05-23                20
393       1988-02-27                13
394       1989-05-20                20
395       1990-05-19                20
396       1991-05-18                20
397       1992-05-16                20
398       1993-05-15                20
399       1994-05-14                20
400       1996-05-18                20
401       1997-05-17                20
402       1998-05-09                20
403       1999-05-15                19
404       2000-05-20                20
405       2001-05-19                20
406       2002-05-18                20
407       2003-05-17                20
408       2004-05-15                20
409       2005-05-21                20
410       2006-05-20                19
411       2007-05-19                20
412       2008-05-17                12
413       2009-05-16                22
414       1985-04-13                17
415       1983-05-14                20
416       1984-05-12                19
417       1986-05-24                18
418       2006-05-20                19
419       2007-05-19                20
420       2008-05-17                12
421       2009-05-16                22
422       2010-05-15                22
423       2011-05-21                22
424       2012-05-19                22
425       2013-05-18                21
426       1985-04-13                17
427       1982-05-22                20
428       1983-05-14                20
429       1984-05-12                19
430       1985-04-13                17
431       1981-04-11                13
432       1997-05-17                20
433       1998-05-09                20
434       1999-05-15                19
435       2000-05-20                20
436       2001-05-19                20
437       2002-05-18                20
438       1995-05-13                20
439       2018-05-19                21
440       2019-05-18                21
441       2020-05-09                18
442       2021-04-10                17
443       1978-05-20                20
444       1979-05-26                20
445       1980-05-24                20
446       1986-05-24                18
447       1989-05-20                20
448       1990-05-19                20
449       1991-05-18                20
450       1992-05-16                20
451       1993-05-15                20
452       1994-05-14                20
453       1995-05-13                20
454       2003-05-17                20
455       2004-05-15                20
456       2005-05-21                20
457       2006-05-20                19
458       2007-05-19                20
459       2008-05-17                12
460       2009-05-16                22
461       2010-05-15                22
462       2020-05-09                18
463       2021-04-10                17
464       2001-05-19                20
465       2002-05-18                20
466       2003-05-17                20
467       2004-05-15                20
468       2005-05-21                20
469       2006-05-20                19
470       1996-05-18                20
471       1997-05-17                20
472       1998-05-09                20
473       1999-05-15                19
474       2000-05-20                20
475       2001-05-19                20
476       2002-05-18                20
477       1991-05-18                20
478       1992-05-16                20
479       1993-05-15                20
480       1994-05-14                20
481       1995-05-13                20
482       1992-05-16                20
483       1999-05-15                19
484       2000-05-20                20
485       2001-05-19                20
486       2002-05-18                20
487       2003-05-17                20
488       2004-05-15                20
489       1995-05-13                20
490       2009-05-16                22
491       2010-05-15                22
492       2011-05-21                22
493       2012-05-19                22
494       2002-05-18                20
495       2003-05-17                20
496       1982-05-22                20
497       1986-05-24                18
498       1987-05-23                20
499       1988-02-27                13
500       1989-05-20                20
501       1990-05-19                20
502       1981-04-11                13
503       1982-05-22                20
504       1983-05-14                20
505       1984-05-12                19
506       2000-05-20                20
507       2001-05-19                20
508       2002-05-18                20
509       2003-05-17                20
510       2004-05-15                20
511       2005-05-21                20
512       2006-05-20                19
513       1980-05-24                20
514       1982-05-22                20
515       1986-05-24                18
516       1980-05-24                20
517       2021-04-10                17
518       1981-04-11                13
519       2017-05-20                21
520       2018-05-19                21
521       2019-05-18                21
522       2020-05-09                18
523       2021-04-10                17
524       1978-05-20                20
525       1979-05-26                20
526       1980-05-24                20
527       2015-05-16                21
528       2016-05-21                21
529       2017-05-20                21
530       2018-05-19                21
531       2019-05-18                21
532       2020-05-09                18
533       2021-04-10                17
534       1986-05-24                18
535       1976-07-31                24
536       1977-05-21                22
537       1978-05-20                20
538       1979-05-26                20
539       1980-05-24                20
540       1985-04-13                17
541       1976-07-31                24
542       1992-05-16                20
543       1993-05-15                20
544       1994-05-14                20
545       1995-05-13                20
546       2015-05-16                21
547       2016-05-21                21
548       2017-05-20                21
549       2018-05-19                21
550       2019-05-18                21
551       2020-05-09                18
552       2021-04-10                17
553       1976-07-31                24
554       1977-05-21                22
555       1987-05-23                20
556       1988-02-27                13
557       1989-05-20                20
558       1990-05-19                20
559       1991-05-18                20
560       1992-05-16                20
561       1993-05-15                20
562       1992-05-16                20
563       2013-05-18                21
564       2014-05-17                21
565       2015-05-16                21
566       2016-05-21                21
567       2017-05-20                21
568       2018-05-19                21
569       2019-05-18                21
570       2020-05-09                18
571       2021-04-10                17
572       2011-05-21                22
573       2012-05-19                22
574       1996-05-18                20
575       1997-05-17                20
576       1998-05-09                20
577       2014-05-17                21
578       2015-05-16                21
579       2016-05-21                21
580       2017-05-20                21
581       2018-05-19                21
582       2019-05-18                21
583       2020-05-09                18
584       2021-04-10                17
585       1976-07-31                24
586       1977-05-21                22
587       1978-05-20                20
588       1979-05-26                20
589       1984-05-12                19
590       1985-04-13                17
591       2011-05-21                22
592       2012-05-19                22
593       2013-05-18                21
594       2014-05-17                21
595       2015-05-16                21
596       2016-05-21                21
597       2017-05-20                21
598       1995-05-13                20
599       1980-05-24                20
600       1976-07-31                24
601       1977-05-21                22
602       1978-05-20                20
603       1979-05-26                20
604       2003-05-17                20
605       2004-05-15                20
606       2005-05-21                20
607       2006-05-20                19
608       2007-05-19                20
609       2008-05-17                12
610       2009-05-16                22
611       2010-05-15                22
612       2011-05-21                22
613       2012-05-19                22
614       2013-05-18                21
# Join the cast_join and actor data frames on the aid column
cast_join <- cast_join %>% 
             inner_join(actor, by = "aid")
# Print the resulting data frame
cast_join
                     aid sid featured first_epid_actor last_epid_actor
1       A. Whitney Brown  11     TRUE       1986-02-22      1986-05-24
2       A. Whitney Brown  12     TRUE       1985-11-09      1987-05-23
3       A. Whitney Brown  13     TRUE       1986-10-11      1988-02-27
4       A. Whitney Brown  14     TRUE       1987-10-17      1989-05-20
5       A. Whitney Brown  15     TRUE       1988-10-08      1990-05-19
6       A. Whitney Brown  16     TRUE       1989-09-30      1991-05-18
7           Alan Zweibel   5     TRUE       1980-04-09      1980-05-24
8         Sasheer Zamata  39     TRUE       2014-01-18      2014-05-17
9         Sasheer Zamata  40     TRUE       1990-09-29      2015-05-16
10        Sasheer Zamata  41    FALSE       1979-10-13      2016-05-21
11        Sasheer Zamata  42    FALSE       2013-09-28      2017-05-20
12            Bowen Yang  45     TRUE       2014-09-27      2020-05-09
13            Bowen Yang  46     TRUE       2015-10-03      2021-04-10
14             Fred Wolf  21     TRUE       2016-10-01      1996-05-18
15             Fred Wolf  22     TRUE       2019-09-28      1996-10-19
16          Casey Wilson  33     TRUE       2008-02-23      1997-05-17
17          Casey Wilson  34     TRUE       2020-10-03      2008-05-17
18          Kristen Wiig  31     TRUE       2005-11-12      2009-05-16
19          Kristen Wiig  32    FALSE       1995-09-30      2006-05-20
20          Kristen Wiig  33    FALSE       1996-09-28      2007-05-19
21          Kristen Wiig  34    FALSE       2007-09-29      2008-05-17
22          Kristen Wiig  35    FALSE       2008-09-13      2009-05-16
23          Kristen Wiig  36    FALSE       2005-10-01      2010-05-15
24          Kristen Wiig  37    FALSE       2006-09-30      2011-05-21
25        Brooks Wheelan  39     TRUE       2007-09-29      2012-05-19
26            Noel Wells  39     TRUE       2008-09-13      2014-05-17
27      Patrick Weathers   6     TRUE       1980-12-13      2014-05-17
28          Damon Wayans  11     TRUE       2009-09-26      1986-03-15
29      Michaela Watkins  34     TRUE       2008-11-15      1981-04-11
30           Nancy Walls  21    FALSE       2010-09-25      1986-05-24
31            Dan Vitale  11     TRUE       2011-09-24      2009-05-16
32    Melissa Villasenor  42     TRUE       2013-09-28      1996-05-18
33    Melissa Villasenor  43     TRUE       2013-09-28      1986-05-24
34    Melissa Villasenor  44    FALSE       1980-11-15      2017-05-20
35    Melissa Villasenor  45    FALSE       1985-11-09      2018-05-19
36    Melissa Villasenor  46    FALSE       2008-09-13      2019-05-18
37         Danitra Vance  11    FALSE       1995-09-30      2020-05-09
38        Kenan Thompson  29     TRUE       1985-11-09      2021-04-10
39        Kenan Thompson  30     TRUE       2016-10-01      1986-05-24
40        Kenan Thompson  31    FALSE       2017-09-30      2004-05-15
41        Kenan Thompson  32    FALSE       2018-09-29      2005-05-21
42        Kenan Thompson  33    FALSE       2019-09-28      2006-05-20
43        Kenan Thompson  34    FALSE       2020-10-03      2007-05-19
44        Kenan Thompson  35    FALSE       1985-11-09      2008-05-17
45        Kenan Thompson  36    FALSE       2003-10-04      2009-05-16
46        Kenan Thompson  37    FALSE       2004-10-02      2010-05-15
47        Kenan Thompson  38    FALSE       2005-10-01      2011-05-21
48        Kenan Thompson  39    FALSE       2006-09-30      2012-05-19
49        Kenan Thompson  40    FALSE       2007-09-29      2013-05-18
50        Kenan Thompson  41    FALSE       2008-09-13      2014-05-17
51        Kenan Thompson  42    FALSE       2009-09-26      2015-05-16
52        Kenan Thompson  43    FALSE       2010-09-25      2016-05-21
53        Kenan Thompson  44    FALSE       2011-09-24      2017-05-20
54        Kenan Thompson  45    FALSE       2012-09-15      2018-05-19
55        Kenan Thompson  46    FALSE       2013-09-28      2019-05-18
56         Terry Sweeney  11    FALSE       2014-09-27      2020-05-09
57         Julia Sweeney  16     TRUE       1990-11-10      2021-04-10
58         Julia Sweeney  17    FALSE       2015-10-03      1986-05-24
59         Julia Sweeney  18    FALSE       2016-10-01      1991-05-18
60         Julia Sweeney  19    FALSE       2017-09-30      1992-05-16
61        Jason Sudeikis  30     TRUE       2005-05-07      1993-05-15
62        Jason Sudeikis  31     TRUE       2018-09-29      1994-05-14
63        Jason Sudeikis  32    FALSE       2019-09-28      2005-05-21
64        Jason Sudeikis  33    FALSE       2020-10-03      2006-05-20
65        Jason Sudeikis  34    FALSE       1985-11-09      2007-05-19
66        Jason Sudeikis  35    FALSE       1990-09-29      2008-05-17
67        Jason Sudeikis  36    FALSE       1991-09-28      2009-05-16
68        Jason Sudeikis  37    FALSE       1992-09-26      2010-05-15
69        Jason Sudeikis  38    FALSE       1993-09-25      2011-05-21
70         Cecily Strong  38     TRUE       2004-10-02      2012-05-19
71         Cecily Strong  39    FALSE       2005-10-01      2013-05-18
72         Cecily Strong  40    FALSE       2006-09-30      2013-05-18
73         Cecily Strong  41    FALSE       2007-09-29      2014-05-17
74         Cecily Strong  42    FALSE       2008-09-13      2015-05-16
75         Cecily Strong  43    FALSE       2009-09-26      2016-05-21
76         Cecily Strong  44    FALSE       2010-09-25      2017-05-20
77         Cecily Strong  45    FALSE       2011-09-24      2018-05-19
78         Cecily Strong  46    FALSE       2012-09-15      2019-05-18
79           Ben Stiller  14     TRUE       1989-03-25      2020-05-09
80     Pamela Stephenson  10    FALSE       2012-09-15      2021-04-10
81           David Spade  16     TRUE       1990-11-10      1989-05-20
82           David Spade  17     TRUE       2013-09-28      1985-04-13
83           David Spade  18     TRUE       2014-09-27      1991-05-18
84           David Spade  19    FALSE       2015-10-03      1992-05-16
85           David Spade  20    FALSE       2016-10-01      1993-05-15
86           David Spade  21    FALSE       2017-09-30      1994-05-14
87         Robert Smigel  17     TRUE       2018-09-29      1995-05-13
88         Robert Smigel  18     TRUE       2019-09-28      1996-05-18
89           Jenny Slate  35     TRUE       2020-10-03      1992-05-16
90       Sarah Silverman  19     TRUE       1993-10-09      1993-05-15
91          Martin Short  10    FALSE       1988-10-08      2010-05-15
92         Harry Shearer   5    FALSE       1984-10-06      1994-05-14
93         Harry Shearer  10    FALSE       1990-09-29      1985-01-12
94         Molly Shannon  20     TRUE       1995-02-25      1985-04-13
95         Molly Shannon  21    FALSE       1991-09-28      1980-05-24
96         Molly Shannon  22    FALSE       1992-09-26      1985-04-13
97         Molly Shannon  23    FALSE       1993-09-25      1995-05-13
98         Molly Shannon  24    FALSE       1994-09-24      1996-05-18
99         Molly Shannon  25    FALSE       1995-09-30      1997-05-17
100        Molly Shannon  26    FALSE       1991-09-28      2001-02-17
101         Paul Shaffer   5     TRUE       1979-11-17      1998-05-09
102        Rob Schneider  16     TRUE       1990-10-27      1999-05-15
103        Rob Schneider  17     TRUE       1992-09-26      2000-05-20
104        Rob Schneider  18    FALSE       2009-09-26      2001-05-19
105        Rob Schneider  19    FALSE       1993-09-25      1980-05-24
106         Tom Schiller   5     TRUE       1980-04-09      1991-05-18
107         Horatio Sanz  24     TRUE       1984-10-06      1992-05-16
108         Horatio Sanz  25    FALSE       1979-10-13      1993-05-15
109         Horatio Sanz  26    FALSE       1984-10-06      1994-05-14
110         Horatio Sanz  27    FALSE       1994-09-24      1980-05-24
111         Horatio Sanz  28    FALSE       1995-09-30      1999-05-15
112         Horatio Sanz  29    FALSE       1996-09-28      2000-05-20
113         Horatio Sanz  30    FALSE       1997-09-27      2001-05-19
114         Horatio Sanz  31    FALSE       1998-09-26      2002-05-18
115         Adam Sandler  16     TRUE       1991-02-09      2003-05-17
116         Adam Sandler  17     TRUE       1999-10-02      2004-05-15
117         Adam Sandler  18     TRUE       2000-10-07      2005-05-21
118         Adam Sandler  19    FALSE       1979-10-13      2006-05-20
119         Adam Sandler  20    FALSE       1990-09-29      1991-05-18
120         Andy Samberg  31     TRUE       1991-09-28      1992-05-16
121         Andy Samberg  32    FALSE       1992-09-26      1993-05-15
122         Andy Samberg  33    FALSE       1993-09-25      1994-05-14
123         Andy Samberg  34    FALSE       1979-10-13      1995-05-13
124         Andy Samberg  35    FALSE       1998-09-26      2006-05-20
125         Andy Samberg  36    FALSE       1999-10-02      2007-05-19
126         Andy Samberg  37    FALSE       2000-10-07      2008-05-17
127         Maya Rudolph  25     TRUE       2000-05-06      2009-05-16
128         Maya Rudolph  26     TRUE       2001-09-29      2010-05-15
129         Maya Rudolph  27    FALSE       2002-10-05      2011-05-21
130         Maya Rudolph  28    FALSE       2003-10-04      2012-05-19
131         Maya Rudolph  29    FALSE       2004-10-02      2000-05-20
132         Maya Rudolph  30    FALSE       2005-10-01      2001-05-19
133         Maya Rudolph  31    FALSE       1990-09-29      2002-05-18
134         Maya Rudolph  32    FALSE       1991-09-28      2003-05-17
135         Maya Rudolph  33    FALSE       1992-09-26      2007-11-03
136        Jon Rudnitsky  41     TRUE       1993-09-25      2004-05-15
137          Tony Rosato   6    FALSE       1981-04-11      2005-05-21
138          Tony Rosato   7    FALSE       1994-09-24      2006-05-20
139       Charles Rocket   6    FALSE       2005-10-01      2007-05-19
140           Chris Rock  16     TRUE       2006-09-30      2008-05-17
141           Chris Rock  17    FALSE       2007-09-29      2016-05-21
142           Chris Rock  18    FALSE       2008-09-13      1981-04-11
143         Tim Robinson  38     TRUE       2009-09-26      1982-05-22
144           Ann Risley   6    FALSE       2010-09-25      1981-04-11
145           Rob Riggle  30     TRUE       2011-09-24      1991-05-18
146        Jeff Richards  27     TRUE       1999-10-02      1992-05-16
147        Jeff Richards  28     TRUE       2000-10-07      1993-05-15
148        Jeff Richards  29    FALSE       2001-09-29      2004-01-17
149           Chris Redd  43     TRUE       2002-10-05      2013-05-18
150           Chris Redd  44     TRUE       2003-10-04      1981-04-11
151           Chris Redd  45    FALSE       2004-10-02      2005-05-21
152           Chris Redd  46    FALSE       2005-10-01      2002-05-18
153         Gilda Radner   1    FALSE       2006-09-30      2003-05-17
154         Gilda Radner   2    FALSE       2007-09-29      2004-05-15
155         Gilda Radner   3    FALSE       2015-10-03      2018-05-19
156         Gilda Radner   4    FALSE       1980-11-15      2019-05-18
157         Gilda Radner   5    FALSE       1981-10-03      2020-05-09
158          Colin Quinn  21     TRUE       1980-11-15      2021-04-10
159          Colin Quinn  22     TRUE       1990-09-29      1976-07-31
160          Colin Quinn  23    FALSE       1991-09-28      1977-05-21
161          Colin Quinn  24    FALSE       1992-09-26      1978-05-20
162          Colin Quinn  25    FALSE       2012-09-15      1979-05-26
163          Randy Quaid  11    FALSE       1980-11-15      1980-05-24
164         Emily Prager   6     TRUE       1981-04-11      1996-05-18
165          Amy Poehler  27     TRUE       2004-10-02      1997-05-17
166          Amy Poehler  28    FALSE       2001-09-29      1998-05-09
167          Amy Poehler  29    FALSE       2002-10-05      1999-05-15
168          Amy Poehler  30    FALSE       2003-10-04      2000-05-20
169          Amy Poehler  31    FALSE       2017-09-30      1986-05-24
170          Amy Poehler  32    FALSE       2018-09-29      1981-04-11
171          Amy Poehler  33    FALSE       2019-09-28      2002-05-18
172          Amy Poehler  34    FALSE       2020-10-03      2008-12-13
173          Joe Piscopo   6    FALSE       1975-10-11      2003-05-17
174          Joe Piscopo   7    FALSE       1976-09-18      2004-05-15
175          Joe Piscopo   8    FALSE       1977-09-24      2005-05-21
176          Joe Piscopo   9    FALSE       1978-10-07      2006-05-20
177          Jay Pharoah  36     TRUE       1979-10-13      2007-05-19
178          Jay Pharoah  37     TRUE       1995-09-30      2008-05-17
179          Jay Pharoah  38    FALSE       1996-09-28      2009-05-16
180          Jay Pharoah  39    FALSE       1997-09-27      1981-04-11
181          Jay Pharoah  40    FALSE       1998-09-26      1982-05-22
182          Jay Pharoah  41    FALSE       1999-10-02      1983-05-14
183         Nasim Pedrad  35     TRUE       1985-11-09      1984-05-12
184         Nasim Pedrad  36     TRUE       1980-11-15      2011-05-21
185         Nasim Pedrad  37    FALSE       2001-09-29      2012-05-19
186         Nasim Pedrad  38    FALSE       2002-10-05      2013-05-18
187         Nasim Pedrad  39    FALSE       2003-10-04      2014-05-17
188        Chris Parnell  24     TRUE       2004-10-02      2015-05-16
189        Chris Parnell  25    FALSE       2005-10-01      2016-05-21
190        Chris Parnell  26    FALSE       2006-09-30      2010-05-15
191        Chris Parnell  27    FALSE       2002-03-02      2011-05-21
192        Chris Parnell  28    FALSE       2007-09-29      2012-05-19
193        Chris Parnell  29    FALSE       2008-09-13      2013-05-18
194        Chris Parnell  30    FALSE       1980-11-15      2014-05-17
195        Chris Parnell  31    FALSE       1981-10-03      1999-05-15
196          Cheri Oteri  21    FALSE       1982-09-25      2000-05-20
197          Cheri Oteri  22    FALSE       1983-10-08      2001-05-19
198          Cheri Oteri  23    FALSE       2010-09-25      2002-05-18
199          Cheri Oteri  24    FALSE       2011-09-24      2003-05-17
200          Cheri Oteri  25    FALSE       2012-09-15      2004-05-15
201   Michael O'Donoghue   1    FALSE       2013-09-28      1975-11-08
202         Mike O'Brien  39     TRUE       2014-09-27      2005-05-21
203           Ego Nwodim  44     TRUE       2015-10-03      2006-05-20
204           Ego Nwodim  45     TRUE       2009-09-26      1996-05-18
205           Ego Nwodim  46    FALSE       2010-09-25      1997-05-17
206            Luke Null  43     TRUE       2011-09-24      1998-05-09
207          Don Novello   5     TRUE       1979-10-13      1999-05-15
208          Don Novello  11     TRUE       2012-09-15      2000-05-20
209       Laraine Newman   1    FALSE       2013-09-28      1976-07-31
210       Laraine Newman   2    FALSE       1998-09-26      2014-05-17
211       Laraine Newman   3    FALSE       1999-10-02      2019-05-18
212       Laraine Newman   4    FALSE       2000-10-07      2020-05-09
213       Laraine Newman   5    FALSE       2001-09-29      2021-04-10
214         Kevin Nealon  12     TRUE       2002-10-05      2018-05-19
215         Kevin Nealon  13    FALSE       2003-10-04      1980-05-24
216         Kevin Nealon  14    FALSE       2004-10-02      1986-05-24
217         Kevin Nealon  15    FALSE       2005-10-01      1976-07-31
218         Kevin Nealon  16    FALSE       1995-09-30      1977-05-21
219         Kevin Nealon  17    FALSE       1996-09-28      1978-05-20
220         Kevin Nealon  18    FALSE       1997-09-27      1979-05-26
221         Kevin Nealon  19    FALSE       1998-09-26      1980-05-24
222         Kevin Nealon  20    FALSE       1999-10-02      1987-05-23
223           Mike Myers  14     TRUE       1989-01-21      1988-02-27
224           Mike Myers  15    FALSE       1975-10-11      1989-05-20
225           Mike Myers  16    FALSE       2013-09-28      1990-05-19
226           Mike Myers  17    FALSE       2018-09-29      1991-05-18
227           Mike Myers  18    FALSE       2019-09-28      1992-05-16
228           Mike Myers  19    FALSE       2020-10-03      1993-05-15
229           Mike Myers  20    FALSE       2017-09-30      1995-01-21
230          Bill Murray   2    FALSE       1977-01-15      1994-05-14
231          Bill Murray   3    FALSE       1979-10-13      1995-05-13
232          Bill Murray   4    FALSE       1985-11-09      1989-05-20
233          Bill Murray   5    FALSE       1975-10-11      1990-05-19
234         Eddie Murphy   6    FALSE       1980-12-13      1991-05-18
235         Eddie Murphy   7    FALSE       1976-09-18      1992-05-16
236         Eddie Murphy   8    FALSE       1977-09-24      1993-05-15
237         Eddie Murphy   9    FALSE       1978-10-07      1984-02-25
238       Bobby Moynihan  34     TRUE       1979-10-13      1994-05-14
239       Bobby Moynihan  35     TRUE       1986-10-11      1995-05-13
240       Bobby Moynihan  36    FALSE       1987-10-17      1977-05-21
241       Bobby Moynihan  37    FALSE       1988-10-08      1978-05-20
242       Bobby Moynihan  38    FALSE       1989-09-30      1979-05-26
243       Bobby Moynihan  39    FALSE       1990-09-29      1980-05-24
244       Bobby Moynihan  40    FALSE       1991-09-28      1981-04-11
245       Bobby Moynihan  41    FALSE       1992-09-26      1982-05-22
246       Bobby Moynihan  42    FALSE       1993-09-25      1983-05-14
247       Garrett Morris   1    FALSE       1994-09-24      1984-05-12
248       Garrett Morris   2    FALSE       1988-10-08      2009-05-16
249       Garrett Morris   3    FALSE       1989-09-30      2010-05-15
250       Garrett Morris   4    FALSE       1990-09-29      2011-05-21
251       Garrett Morris   5    FALSE       1991-09-28      2012-05-19
252         Tracy Morgan  22    FALSE       1992-09-26      2013-05-18
253         Tracy Morgan  23    FALSE       1993-09-25      2014-05-17
254         Tracy Morgan  24    FALSE       1994-09-24      2015-05-16
255         Tracy Morgan  25    FALSE       1976-09-18      2016-05-21
256         Tracy Morgan  26    FALSE       1977-09-24      2017-05-20
257         Tracy Morgan  27    FALSE       1978-10-07      1976-07-31
258         Tracy Morgan  28    FALSE       1979-10-13      1977-05-21
259          Kyle Mooney  39     TRUE       1980-11-15      1978-05-20
260          Kyle Mooney  40     TRUE       1981-10-03      1979-05-26
261          Kyle Mooney  41    FALSE       1982-09-25      1980-05-24
262          Kyle Mooney  42    FALSE       1983-10-08      1997-05-17
263          Kyle Mooney  43    FALSE       2008-09-13      1998-05-09
264          Kyle Mooney  44    FALSE       2009-09-26      1999-05-15
265          Kyle Mooney  45    FALSE       2010-09-25      2000-05-20
266          Kyle Mooney  46    FALSE       2011-09-24      2001-05-19
267             Jay Mohr  19     TRUE       1993-10-09      2002-05-18
268             Jay Mohr  20     TRUE       2012-09-15      2003-05-17
269          Alex Moffat  42     TRUE       2013-09-28      2014-05-17
270          Alex Moffat  43     TRUE       2014-09-27      2015-05-16
271          Alex Moffat  44    FALSE       2015-10-03      2016-05-21
272          Alex Moffat  45    FALSE       2016-10-01      2017-05-20
273          Alex Moffat  46    FALSE       1975-10-11      2018-05-19
274     Finesse Mitchell  29     TRUE       1976-09-18      2019-05-18
275     Finesse Mitchell  30     TRUE       1977-09-24      2020-05-09
276     Finesse Mitchell  31    FALSE       1978-10-07      2021-04-10
277          Jerry Minor  26     TRUE       1979-10-13      1994-05-14
278        Dennis Miller  11    FALSE       1996-09-28      1995-05-13
279        Dennis Miller  12    FALSE       1997-09-27      2017-05-20
280        Dennis Miller  13    FALSE       1998-09-26      2018-05-19
281        Dennis Miller  14    FALSE       1999-10-02      2019-05-18
282        Dennis Miller  15    FALSE       2000-10-07      2020-05-09
283        Dennis Miller  16    FALSE       2001-09-29      2021-04-10
284        John Milhiser  39     TRUE       2002-10-05      2004-05-15
285          Seth Meyers  27     TRUE       2013-09-28      2005-05-21
286          Seth Meyers  28     TRUE       2014-09-27      2006-05-20
287          Seth Meyers  29    FALSE       2015-10-03      2001-05-19
288          Seth Meyers  30    FALSE       2016-10-01      1986-05-24
289          Seth Meyers  31    FALSE       2017-09-30      1987-05-23
290          Seth Meyers  32    FALSE       2018-09-29      1988-02-27
291          Seth Meyers  33    FALSE       2019-09-28      1989-05-20
292          Seth Meyers  34    FALSE       2020-10-03      1990-05-19
293          Seth Meyers  35    FALSE       1993-09-25      1991-05-18
294          Seth Meyers  36    FALSE       1994-09-24      2014-05-17
295          Seth Meyers  37    FALSE       2016-10-01      2002-05-18
296          Seth Meyers  38    FALSE       2017-09-30      2003-05-17
297          Seth Meyers  39    FALSE       2018-09-29      2014-02-01
298       Laurie Metcalf   6     TRUE       1981-04-11      2004-05-15
299          Tim Meadows  16     TRUE       1991-02-09      2005-05-21
300          Tim Meadows  17     TRUE       2019-09-28      2006-05-20
301          Tim Meadows  18     TRUE       2020-10-03      2007-05-19
302          Tim Meadows  19    FALSE       2003-10-04      2008-05-17
303          Tim Meadows  20    FALSE       2004-10-02      2009-05-16
304          Tim Meadows  21    FALSE       2005-10-01      2010-05-15
305          Tim Meadows  22    FALSE       2000-10-07      2011-05-21
306          Tim Meadows  23    FALSE       1985-11-09      2012-05-19
307          Tim Meadows  24    FALSE       1986-10-11      2013-05-18
308          Tim Meadows  25    FALSE       1987-10-17      2014-05-17
309        Kate McKinnon  37     TRUE       2012-04-07      1981-04-11
310        Kate McKinnon  38     TRUE       1988-10-08      1991-05-18
311        Kate McKinnon  39    FALSE       1989-09-30      1992-05-16
312        Kate McKinnon  40    FALSE       1990-09-29      1993-05-15
313        Kate McKinnon  41    FALSE       2013-09-28      1994-05-14
314        Kate McKinnon  42    FALSE       2001-09-29      1995-05-13
315        Kate McKinnon  43    FALSE       2002-10-05      1996-05-18
316        Kate McKinnon  44    FALSE       2003-10-04      1997-05-17
317        Kate McKinnon  45    FALSE       2004-10-02      1998-05-09
318        Kate McKinnon  46    FALSE       2005-10-01      1999-05-15
319        Mark McKinney  20    FALSE       1995-01-14      2000-05-20
320        Mark McKinney  21    FALSE       2006-09-30      2012-05-19
321        Mark McKinney  22    FALSE       2007-09-29      2013-05-18
322       Michael McKean  19    FALSE       1994-03-12      2014-05-17
323       Michael McKean  20    FALSE       2008-09-13      2015-05-16
324        Gail Matthius   6    FALSE       2009-09-26      2016-05-21
325       Norm MacDonald  19     TRUE       1993-10-02      2017-05-20
326       Norm MacDonald  20    FALSE       2010-09-25      2018-05-19
327       Norm MacDonald  21    FALSE       2011-09-24      2019-05-18
328       Norm MacDonald  22    FALSE       2012-09-15      2020-05-09
329       Norm MacDonald  23    FALSE       2013-09-28      1998-03-14
330           Jon Lovitz  11    FALSE       1980-11-15      2021-04-10
331           Jon Lovitz  12    FALSE       1990-09-29      1995-05-13
332           Jon Lovitz  13    FALSE       1991-09-28      1996-05-18
333           Jon Lovitz  14    FALSE       1992-09-26      1997-05-17
334           Jon Lovitz  15    FALSE       1993-09-25      1994-05-14
335  Julia Louis-Dreyfus   8    FALSE       1994-09-24      1995-05-13
336  Julia Louis-Dreyfus   9    FALSE       1995-09-30      1981-04-11
337  Julia Louis-Dreyfus  10    FALSE       1996-09-28      1994-05-14
338     Matthew Laurance   6     TRUE       1980-12-13      1995-05-13
339         Gary Kroeger   8    FALSE       1997-09-27      1996-05-18
340         Gary Kroeger   9    FALSE       1998-09-26      1997-05-17
341         Gary Kroeger  10    FALSE       1999-10-02      1998-05-09
342       David Koechner  21    FALSE       2011-09-24      1986-05-24
343         Taran Killam  36     TRUE       2012-09-15      1987-05-23
344         Taran Killam  37     TRUE       2013-09-28      1988-02-27
345         Taran Killam  38    FALSE       2014-09-27      1989-05-20
346         Taran Killam  39    FALSE       2015-10-03      1990-05-19
347         Taran Killam  40    FALSE       2016-10-01      1983-05-14
348         Taran Killam  41    FALSE       2017-09-30      1984-05-12
349    Laura Kightlinger  20     TRUE       2018-09-29      1985-04-13
350       Tim Kazurinsky   6    FALSE       1981-04-11      1981-04-11
351       Tim Kazurinsky   7    FALSE       2019-09-28      1983-05-14
352       Tim Kazurinsky   8    FALSE       2020-10-03      1984-05-12
353       Tim Kazurinsky   9    FALSE       1994-09-24      1985-04-13
354         Chris Kattan  21     TRUE       1996-03-16      1996-05-18
355         Chris Kattan  22    FALSE       1995-09-30      2011-05-21
356         Chris Kattan  23    FALSE       1996-09-28      2012-05-19
357         Chris Kattan  24    FALSE       1993-09-25      2013-05-18
358         Chris Kattan  25    FALSE       1994-09-24      2014-05-17
359         Chris Kattan  26    FALSE       1980-11-15      2015-05-16
360         Chris Kattan  27    FALSE       1993-09-25      2016-05-21
361         Chris Kattan  28    FALSE       1994-09-24      1995-05-13
362           Colin Jost  39     TRUE       2014-03-01      1981-04-11
363           Colin Jost  40     TRUE       1995-09-30      1982-05-22
364           Colin Jost  41    FALSE       1996-09-28      1983-05-14
365           Colin Jost  42    FALSE       1997-09-27      1984-05-12
366           Colin Jost  43    FALSE       1985-11-09      1996-05-18
367           Colin Jost  44    FALSE       1986-10-11      1997-05-17
368           Colin Jost  45    FALSE       1987-10-17      1998-05-09
369           Colin Jost  46    FALSE       1988-10-08      1999-05-15
370         Leslie Jones  40     TRUE       2014-10-25      2000-05-20
371         Leslie Jones  41     TRUE       1989-09-30      2001-05-19
372         Leslie Jones  42    FALSE       1982-09-25      2002-05-18
373         Leslie Jones  43    FALSE       1983-10-08      2003-05-17
374         Leslie Jones  44    FALSE       1984-10-06      2014-05-17
375       Punkie Johnson  46     TRUE       1980-11-15      2015-05-16
376     Victoria Jackson  12    FALSE       1982-09-25      2016-05-21
377     Victoria Jackson  13    FALSE       1983-10-08      2017-05-20
378     Victoria Jackson  14    FALSE       1984-10-06      2018-05-19
379     Victoria Jackson  15    FALSE       1995-09-30      2019-05-18
380     Victoria Jackson  16    FALSE       2010-09-25      2020-05-09
381     Victoria Jackson  17    FALSE       2011-09-24      2021-04-10
382      Melanie Hutsell  17     TRUE       1991-11-16      2015-05-16
383      Melanie Hutsell  18     TRUE       2012-09-15      2016-05-21
384      Melanie Hutsell  19    FALSE       2013-09-28      2017-05-20
385        Yvonne Hudson   6     TRUE       1980-12-20      2018-05-19
386            Jan Hooks  12    FALSE       2014-09-27      2019-05-18
387            Jan Hooks  13    FALSE       2015-10-03      2021-04-10
388            Jan Hooks  14    FALSE       1994-09-24      1987-05-23
389            Jan Hooks  15    FALSE       1980-11-15      1988-02-27
390            Jan Hooks  16    FALSE       1981-10-03      1989-05-20
391          Lauren Holt  46     TRUE       1982-09-25      1990-05-19
392         Phil Hartman  12    FALSE       1983-10-08      1991-05-18
393         Phil Hartman  13    FALSE       1995-09-30      1992-05-16
394         Phil Hartman  14    FALSE       1996-09-28      1992-05-16
395         Phil Hartman  15    FALSE       1997-09-27      1993-05-15
396         Phil Hartman  16    FALSE       1998-09-26      1994-05-14
397         Phil Hartman  17    FALSE       1999-10-02      1981-04-11
398         Phil Hartman  18    FALSE       2000-10-07      1987-05-23
399         Phil Hartman  19    FALSE       2001-09-29      1988-02-27
400      Darrell Hammond  21    FALSE       2002-10-05      1989-05-20
401      Darrell Hammond  22    FALSE       2013-09-28      1990-05-19
402      Darrell Hammond  23    FALSE       2014-09-27      1991-05-18
403      Darrell Hammond  24    FALSE       2015-10-03      2021-04-10
404      Darrell Hammond  25    FALSE       2016-10-01      1987-05-23
405      Darrell Hammond  26    FALSE       2017-09-30      1988-02-27
406      Darrell Hammond  27    FALSE       2018-09-29      1989-05-20
407      Darrell Hammond  28    FALSE       2019-09-28      1990-05-19
408      Darrell Hammond  29    FALSE       2020-10-03      1991-05-18
409      Darrell Hammond  30    FALSE       2014-09-27      1992-05-16
410      Darrell Hammond  31    FALSE       2015-10-03      1993-05-15
411      Darrell Hammond  32    FALSE       2016-10-01      1994-05-14
412      Darrell Hammond  33    FALSE       2017-09-30      1996-05-18
413      Darrell Hammond  34    FALSE       2018-09-29      1997-05-17
414            Rich Hall  10    FALSE       2020-10-03      1998-05-09
415            Brad Hall   8    FALSE       1986-10-11      1999-05-15
416            Brad Hall   9    FALSE       1987-10-17      2000-05-20
417 Anthony Michael Hall  11    FALSE       1988-10-08      2001-05-19
418           Bill Hader  31     TRUE       1989-09-30      2002-05-18
419           Bill Hader  32    FALSE       1990-09-29      2003-05-17
420           Bill Hader  33    FALSE       1991-09-28      2004-05-15
421           Bill Hader  34    FALSE       1991-09-28      2005-05-21
422           Bill Hader  35    FALSE       1992-09-26      2006-05-20
423           Bill Hader  36    FALSE       1993-09-25      2007-05-19
424           Bill Hader  37    FALSE       1980-11-15      2008-05-17
425           Bill Hader  38    FALSE       1986-10-11      2009-05-16
426    Christopher Guest  10    FALSE       1987-10-17      1985-04-13
427           Mary Gross   7    FALSE       1988-10-08      1983-05-14
428           Mary Gross   8    FALSE       1989-09-30      1984-05-12
429           Mary Gross   9    FALSE       1990-09-29      1986-05-24
430           Mary Gross  10    FALSE       2020-10-03      2006-05-20
431    Gilbert Gottfried   6    FALSE       1986-10-11      2007-05-19
432         Ana Gasteyer  22    FALSE       1987-10-17      2008-05-17
433         Ana Gasteyer  23    FALSE       1988-10-08      2009-05-16
434         Ana Gasteyer  24    FALSE       1989-09-30      2010-05-15
435         Ana Gasteyer  25    FALSE       1990-09-29      2011-05-21
436         Ana Gasteyer  26    FALSE       1991-09-28      2012-05-19
437         Ana Gasteyer  27    FALSE       1992-09-26      2013-05-18
438     Janeane Garofalo  20    FALSE       1993-09-25      1995-02-25
439        Heidi Gardner  43     TRUE       1995-09-30      1985-04-13
440        Heidi Gardner  44     TRUE       1996-09-28      1982-05-22
441        Heidi Gardner  45    FALSE       1997-09-27      1983-05-14
442        Heidi Gardner  46    FALSE       1998-09-26      1984-05-12
443           Al Franken   3     TRUE       1999-10-02      1985-04-13
444           Al Franken   4     TRUE       2000-10-07      1981-04-11
445           Al Franken   5     TRUE       1979-12-15      1997-05-17
446           Al Franken  11     TRUE       1986-03-22      1998-05-09
447           Al Franken  14     TRUE       2001-09-29      1999-05-15
448           Al Franken  15     TRUE       2002-10-05      2000-05-20
449           Al Franken  16     TRUE       2003-10-04      2001-05-19
450           Al Franken  17     TRUE       2004-10-02      2002-05-18
451           Al Franken  18     TRUE       2005-10-01      1995-05-13
452           Al Franken  19     TRUE       2006-09-30      2018-05-19
453           Al Franken  20     TRUE       2007-09-29      2019-05-18
454           Will Forte  28     TRUE       2008-09-13      2020-05-09
455           Will Forte  29    FALSE       1984-10-06      2021-04-10
456           Will Forte  30    FALSE       1982-09-25      1978-05-20
457           Will Forte  31    FALSE       1983-10-08      1979-05-26
458           Will Forte  32    FALSE       1985-11-09      1980-05-24
459           Will Forte  33    FALSE       2005-10-01      1986-05-24
460           Will Forte  34    FALSE       2006-09-30      1989-05-20
461           Will Forte  35    FALSE       2007-09-29      1990-05-19
462        Chloe Fineman  45     TRUE       2008-09-13      1991-05-18
463        Chloe Fineman  46     TRUE       2009-09-26      1992-05-16
464             Tina Fey  26     TRUE       2010-09-25      1993-05-15
465             Tina Fey  27    FALSE       2011-09-24      1994-05-14
466             Tina Fey  28    FALSE       2012-09-15      1995-05-13
467             Tina Fey  29    FALSE       1984-10-06      2003-05-17
468             Tina Fey  30    FALSE       1981-10-03      2004-05-15
469             Tina Fey  31    FALSE       1982-09-25      2005-05-21
470         Will Ferrell  21    FALSE       1983-10-08      2006-05-20
471         Will Ferrell  22    FALSE       1984-10-06      2007-05-19
472         Will Ferrell  23    FALSE       1980-11-15      2008-05-17
473         Will Ferrell  24    FALSE       1996-09-28      2009-05-16
474         Will Ferrell  25    FALSE       1997-09-27      2010-05-15
475         Will Ferrell  26    FALSE       1998-09-26      2020-05-09
476         Will Ferrell  27    FALSE       1999-10-02      2021-04-10
477         Chris Farley  16     TRUE       2000-10-07      2001-05-19
478         Chris Farley  17    FALSE       2001-09-29      2002-05-18
479         Chris Farley  18    FALSE       1994-09-24      2003-05-17
480         Chris Farley  19    FALSE       2017-09-30      2004-05-15
481         Chris Farley  20    FALSE       2018-09-29      2005-05-21
482       Siobhan Fallon  17     TRUE       2019-09-28      2006-05-20
483         Jimmy Fallon  24     TRUE       2020-10-03      1996-05-18
484         Jimmy Fallon  25    FALSE       1977-09-24      1997-05-17
485         Jimmy Fallon  26    FALSE       1978-10-07      1998-05-09
486         Jimmy Fallon  27    FALSE       1979-10-13      1999-05-15
487         Jimmy Fallon  28    FALSE       1985-11-09      2000-05-20
488         Jimmy Fallon  29    FALSE       1988-10-08      2001-05-19
489        Chris Elliott  20    FALSE       1989-09-30      2002-05-18
490         Abby Elliott  34     TRUE       2008-11-15      1991-05-18
491         Abby Elliott  35     TRUE       1990-09-29      1992-05-16
492         Abby Elliott  36    FALSE       1991-09-28      1993-05-15
493         Abby Elliott  37    FALSE       1992-09-26      1994-05-14
494         Dean Edwards  27     TRUE       1993-09-25      1995-05-13
495         Dean Edwards  28     TRUE       1994-09-24      1992-05-16
496   Christine Ebersole   7    FALSE       2002-10-05      1999-05-15
497            Nora Dunn  11    FALSE       2003-10-04      2000-05-20
498            Nora Dunn  12    FALSE       2004-10-02      2001-05-19
499            Nora Dunn  13    FALSE       2005-10-01      2002-05-18
500            Nora Dunn  14    FALSE       2006-09-30      2003-05-17
501            Nora Dunn  15    FALSE       2007-09-29      2004-05-15
502           Robin Duke   6    FALSE       1981-04-11      1995-05-13
503           Robin Duke   7    FALSE       2008-09-13      2009-05-16
504           Robin Duke   8    FALSE       2009-09-26      2010-05-15
505           Robin Duke   9    FALSE       2019-09-28      2011-05-21
506        Rachel Dratch  25     TRUE       1999-10-23      2012-05-19
507        Rachel Dratch  26     TRUE       2020-10-03      2002-05-18
508        Rachel Dratch  27    FALSE       2000-10-07      2003-05-17
509        Rachel Dratch  28    FALSE       2001-09-29      1982-05-22
510        Rachel Dratch  29    FALSE       2002-10-05      1986-05-24
511        Rachel Dratch  30    FALSE       2003-10-04      1987-05-23
512        Rachel Dratch  31    FALSE       2004-10-02      1988-02-27
513   Brian Doyle-Murray   5     TRUE       1980-01-26      1989-05-20
514   Brian Doyle-Murray   7     TRUE       2005-10-01      1990-05-19
515    Robert Downey Jr.  11    FALSE       1995-09-30      1981-04-11
516           Jim Downey   5     TRUE       1980-01-26      1982-05-22
517      Andrew Dismukes  46     TRUE       1996-09-28      1983-05-14
518         Denny Dillon   6    FALSE       1997-09-27      1984-05-12
519            Mikey Day  42     TRUE       1998-09-26      2000-05-20
520            Mikey Day  43     TRUE       1999-10-02      2001-05-19
521            Mikey Day  44    FALSE       2000-10-07      2002-05-18
522            Mikey Day  45    FALSE       2001-09-29      2003-05-17
523            Mikey Day  46    FALSE       1990-09-29      2004-05-15
524            Tom Davis   3     TRUE       1991-09-28      2005-05-21
525            Tom Davis   4     TRUE       1992-09-26      2006-05-20
526            Tom Davis   5     TRUE       1979-11-17      1980-05-24
527        Pete Davidson  40     TRUE       1993-09-25      1982-05-22
528        Pete Davidson  41     TRUE       1994-09-24      1986-05-24
529        Pete Davidson  42    FALSE       1991-09-28      1980-05-24
530        Pete Davidson  43    FALSE       1998-09-26      2021-04-10
531        Pete Davidson  44    FALSE       1999-10-02      1981-04-11
532        Pete Davidson  45    FALSE       2000-10-07      2017-05-20
533        Pete Davidson  46    FALSE       2001-09-29      2018-05-19
534          Joan Cusack  11    FALSE       2002-10-05      2019-05-18
535          Jane Curtin   1    FALSE       2003-10-04      2020-05-09
536          Jane Curtin   2    FALSE       1994-09-24      2021-04-10
537          Jane Curtin   3    FALSE       2008-09-13      1978-05-20
538          Jane Curtin   4    FALSE       2009-09-26      1979-05-26
539          Jane Curtin   5    FALSE       2010-09-25      1980-05-24
540        Billy Crystal  10    FALSE       2011-09-24      2015-05-16
541           George Coe   1    FALSE       2001-09-29      1975-10-11
542      Ellen Cleghorne  17     TRUE       2002-10-05      2016-05-21
543      Ellen Cleghorne  18     TRUE       1981-10-03      2017-05-20
544      Ellen Cleghorne  19    FALSE       1985-11-09      2018-05-19
545      Ellen Cleghorne  20    FALSE       1986-10-11      2019-05-18
546          Michael Che  40     TRUE       1987-10-17      2020-05-09
547          Michael Che  41     TRUE       1988-10-08      2021-04-10
548          Michael Che  42    FALSE       1989-09-30      1986-05-24
549          Michael Che  43    FALSE       1980-11-15      1976-07-31
550          Michael Che  44    FALSE       1981-10-03      1977-05-21
551          Michael Che  45    FALSE       1982-09-25      1978-05-20
552          Michael Che  46    FALSE       1983-10-08      1979-05-26
553          Chevy Chase   1    FALSE       1999-10-02      1980-05-24
554          Chevy Chase   2    FALSE       2000-10-07      1976-10-30
555          Dana Carvey  12    FALSE       2001-09-29      1985-04-13
556          Dana Carvey  13    FALSE       2002-10-05      1976-07-31
557          Dana Carvey  14    FALSE       2003-10-04      1992-05-16
558          Dana Carvey  15    FALSE       2004-10-02      1993-05-15
559          Dana Carvey  16    FALSE       2005-10-01      1994-05-14
560          Dana Carvey  17    FALSE       1979-10-13      1995-05-13
561          Dana Carvey  18    FALSE       1981-10-03      1993-02-06
562          Beth Cahill  17     TRUE       1991-11-16      2015-05-16
563          Aidy Bryant  38     TRUE       1985-11-09      2016-05-21
564          Aidy Bryant  39    FALSE       1979-10-13      2017-05-20
565          Aidy Bryant  40    FALSE       2020-10-03      2018-05-19
566          Aidy Bryant  41    FALSE       1980-11-15      2019-05-18
567          Aidy Bryant  42    FALSE       2016-10-01      2020-05-09
568          Aidy Bryant  43    FALSE       2017-09-30      2021-04-10
569          Aidy Bryant  44    FALSE       2018-09-29      1976-07-31
570          Aidy Bryant  45    FALSE       2019-09-28      1977-05-21
571          Aidy Bryant  46    FALSE       2020-10-03      1987-05-23
572        Paul Brittain  36     TRUE       1977-09-24      1988-02-27
573        Paul Brittain  37     TRUE       1978-10-07      2012-01-14
574           Jim Breuer  21    FALSE       1979-10-13      1989-05-20
575           Jim Breuer  22    FALSE       2014-09-27      1990-05-19
576           Jim Breuer  23    FALSE       2015-10-03      1991-05-18
577         Beck Bennett  39     TRUE       2016-10-01      1992-05-16
578         Beck Bennett  40     TRUE       2017-09-30      1993-05-15
579         Beck Bennett  41    FALSE       2018-09-29      1992-05-16
580         Beck Bennett  42    FALSE       2019-09-28      2013-05-18
581         Beck Bennett  43    FALSE       2020-10-03      2014-05-17
582         Beck Bennett  44    FALSE       1985-11-09      2015-05-16
583         Beck Bennett  45    FALSE       1975-10-11      2016-05-21
584         Beck Bennett  46    FALSE       1976-09-18      2017-05-20
585         John Belushi   1    FALSE       1977-09-24      2018-05-19
586         John Belushi   2    FALSE       1978-10-07      2019-05-18
587         John Belushi   3    FALSE       1979-10-13      2020-05-09
588         John Belushi   4    FALSE       1984-10-06      2021-04-10
589          Jim Belushi   9    FALSE       1975-10-11      2011-05-21
590          Jim Belushi  10    FALSE       1991-09-28      2012-05-19
591        Vanessa Bayer  36     TRUE       1992-09-26      1996-05-18
592        Vanessa Bayer  37     TRUE       1993-09-25      1997-05-17
593        Vanessa Bayer  38    FALSE       1994-09-24      1998-05-09
594        Vanessa Bayer  39    FALSE       2014-09-27      2014-05-17
595        Vanessa Bayer  40    FALSE       2015-10-03      2015-05-16
596        Vanessa Bayer  41    FALSE       2016-10-01      2016-05-21
597        Vanessa Bayer  42    FALSE       2017-09-30      2017-05-20
598       Morwenna Banks  20    FALSE       1995-04-08      2018-05-19
599        Peter Aykroyd   5     TRUE       1980-01-26      2019-05-18
600          Dan Aykroyd   1    FALSE       2018-09-29      2020-05-09
601          Dan Aykroyd   2    FALSE       2019-09-28      2021-04-10
602          Dan Aykroyd   3    FALSE       2020-10-03      1976-07-31
603          Dan Aykroyd   4    FALSE       1975-10-11      1977-05-21
604         Fred Armisen  28     TRUE       1976-09-18      1978-05-20
605         Fred Armisen  29     TRUE       1986-10-11      1979-05-26
606         Fred Armisen  30    FALSE       1987-10-17      1984-05-12
607         Fred Armisen  31    FALSE       1988-10-08      1985-04-13
608         Fred Armisen  32    FALSE       1989-09-30      2011-05-21
609         Fred Armisen  33    FALSE       1990-09-29      2012-05-19
610         Fred Armisen  34    FALSE       1991-09-28      2013-05-18
611         Fred Armisen  35    FALSE       1992-09-26      2014-05-17
612         Fred Armisen  36    FALSE       1991-09-28      2015-05-16
613         Fred Armisen  37    FALSE       2012-09-15      2016-05-21
614         Fred Armisen  38    FALSE       2013-09-28      2017-05-20
    upload_anchor n_episodes_actor %_apperance year first_epid_season
1           FALSE                8  0.44444444 1985        1985-11-09
2           FALSE               20  1.00000000 1986        1986-10-11
3           FALSE               13  1.00000000 1987        1987-10-17
4           FALSE               20  1.00000000 1988        1988-10-08
5           FALSE               20  1.00000000 1989        1989-09-30
6           FALSE               20  1.00000000 1990        1990-09-29
7           FALSE                5  0.25000000 1979        1979-10-13
8           FALSE               11  0.52380952 2013        2013-09-28
9           FALSE               21  1.00000000 2014        2014-09-27
10          FALSE               21  1.00000000 2015        2015-10-03
11          FALSE               21  1.00000000 2016        2016-10-01
12          FALSE               18  1.00000000 2019        2019-09-28
13          FALSE               17  1.00000000 2020        2020-10-03
14          FALSE               20  1.00000000 1995        1995-09-30
15          FALSE                3  0.15000000 1996        1996-09-28
16          FALSE                8  0.66666667 2007        2007-09-29
17          FALSE               22  1.00000000 2008        2008-09-13
18          FALSE               15  0.78947368 2005        2005-10-01
19          FALSE               20  1.00000000 2006        2006-09-30
20          FALSE               12  1.00000000 2007        2007-09-29
21          FALSE               22  1.00000000 2008        2008-09-13
22          FALSE               22  1.00000000 2009        2009-09-26
23          FALSE               22  1.00000000 2010        2010-09-25
24          FALSE               22  1.00000000 2011        2011-09-24
25          FALSE               21  1.00000000 2013        2013-09-28
26          FALSE               21  1.00000000 2013        2013-09-28
27          FALSE               10  0.76923077 1980        1980-11-15
28          FALSE               12  0.66666667 1985        1985-11-09
29          FALSE               15  0.68181818 2008        2008-09-13
30          FALSE               20  1.00000000 1995        1995-09-30
31          FALSE               18  1.00000000 1985        1985-11-09
32          FALSE               21  1.00000000 2016        2016-10-01
33          FALSE               21  1.00000000 2017        2017-09-30
34          FALSE               21  1.00000000 2018        2018-09-29
35          FALSE               18  1.00000000 2019        2019-09-28
36          FALSE               17  1.00000000 2020        2020-10-03
37          FALSE               18  1.00000000 1985        1985-11-09
38          FALSE               20  1.00000000 2003        2003-10-04
39          FALSE               20  1.00000000 2004        2004-10-02
40          FALSE               19  1.00000000 2005        2005-10-01
41          FALSE               20  1.00000000 2006        2006-09-30
42          FALSE               12  1.00000000 2007        2007-09-29
43          FALSE               22  1.00000000 2008        2008-09-13
44          FALSE               22  1.00000000 2009        2009-09-26
45          FALSE               22  1.00000000 2010        2010-09-25
46          FALSE               22  1.00000000 2011        2011-09-24
47          FALSE               21  1.00000000 2012        2012-09-15
48          FALSE               21  1.00000000 2013        2013-09-28
49          FALSE               21  1.00000000 2014        2014-09-27
50          FALSE               21  1.00000000 2015        2015-10-03
51          FALSE               21  1.00000000 2016        2016-10-01
52          FALSE               21  1.00000000 2017        2017-09-30
53          FALSE               21  1.00000000 2018        2018-09-29
54          FALSE               18  1.00000000 2019        2019-09-28
55          FALSE               17  1.00000000 2020        2020-10-03
56          FALSE               18  1.00000000 1985        1985-11-09
57          FALSE               16  0.80000000 1990        1990-09-29
58          FALSE               20  1.00000000 1991        1991-09-28
59          FALSE               20  1.00000000 1992        1992-09-26
60          FALSE               20  1.00000000 1993        1993-09-25
61          FALSE                3  0.15000000 2004        2004-10-02
62          FALSE               19  1.00000000 2005        2005-10-01
63          FALSE               20  1.00000000 2006        2006-09-30
64          FALSE               12  1.00000000 2007        2007-09-29
65          FALSE               22  1.00000000 2008        2008-09-13
66          FALSE               22  1.00000000 2009        2009-09-26
67          FALSE               22  1.00000000 2010        2010-09-25
68          FALSE               22  1.00000000 2011        2011-09-24
69          FALSE               21  1.00000000 2012        2012-09-15
70          FALSE               21  1.00000000 2012        2012-09-15
71           TRUE               21  1.00000000 2013        2013-09-28
72          FALSE               21  1.00000000 2014        2014-09-27
73          FALSE               21  1.00000000 2015        2015-10-03
74          FALSE               21  1.00000000 2016        2016-10-01
75          FALSE               21  1.00000000 2017        2017-09-30
76          FALSE               21  1.00000000 2018        2018-09-29
77          FALSE               18  1.00000000 2019        2019-09-28
78          FALSE               17  1.00000000 2020        2020-10-03
79          FALSE                6  0.30000000 1988        1988-10-08
80          FALSE               17  1.00000000 1984        1984-10-06
81          FALSE               16  0.80000000 1990        1990-09-29
82          FALSE               20  1.00000000 1991        1991-09-28
83          FALSE               20  1.00000000 1992        1992-09-26
84          FALSE               20  1.00000000 1993        1993-09-25
85          FALSE               20  1.00000000 1994        1994-09-24
86          FALSE               20  1.00000000 1995        1995-09-30
87          FALSE               20  1.00000000 1991        1991-09-28
88          FALSE               20  1.00000000 1992        1992-09-26
89          FALSE               22  1.00000000 2009        2009-09-26
90          FALSE               18  0.90000000 1993        1993-09-25
91          FALSE               17  1.00000000 1984        1984-10-06
92          FALSE               20  1.00000000 1979        1979-10-13
93          FALSE               10  0.58823529 1984        1984-10-06
94          FALSE                7  0.35000000 1994        1994-09-24
95          FALSE               20  1.00000000 1995        1995-09-30
96          FALSE               20  1.00000000 1996        1996-09-28
97          FALSE               20  1.00000000 1997        1997-09-27
98          FALSE               19  1.00000000 1998        1998-09-26
99          FALSE               20  1.00000000 1999        1999-10-02
100         FALSE               12  0.60000000 2000        2000-10-07
101         FALSE               16  0.80000000 1979        1979-10-13
102         FALSE               17  0.85000000 1990        1990-09-29
103         FALSE               20  1.00000000 1991        1991-09-28
104         FALSE               20  1.00000000 1992        1992-09-26
105         FALSE               20  1.00000000 1993        1993-09-25
106         FALSE                5  0.25000000 1979        1979-10-13
107         FALSE               19  1.00000000 1998        1998-09-26
108         FALSE               20  1.00000000 1999        1999-10-02
109         FALSE               20  1.00000000 2000        2000-10-07
110         FALSE               20  1.00000000 2001        2001-09-29
111         FALSE               20  1.00000000 2002        2002-10-05
112         FALSE               20  1.00000000 2003        2003-10-04
113         FALSE               20  1.00000000 2004        2004-10-02
114          TRUE               19  1.00000000 2005        2005-10-01
115         FALSE                9  0.45000000 1990        1990-09-29
116         FALSE               20  1.00000000 1991        1991-09-28
117         FALSE               20  1.00000000 1992        1992-09-26
118         FALSE               20  1.00000000 1993        1993-09-25
119         FALSE               20  1.00000000 1994        1994-09-24
120         FALSE               19  1.00000000 2005        2005-10-01
121         FALSE               20  1.00000000 2006        2006-09-30
122         FALSE               12  1.00000000 2007        2007-09-29
123         FALSE               22  1.00000000 2008        2008-09-13
124         FALSE               22  1.00000000 2009        2009-09-26
125         FALSE               22  1.00000000 2010        2010-09-25
126         FALSE               22  1.00000000 2011        2011-09-24
127         FALSE                3  0.15000000 1999        1999-10-02
128         FALSE               20  1.00000000 2000        2000-10-07
129         FALSE               20  1.00000000 2001        2001-09-29
130         FALSE               20  1.00000000 2002        2002-10-05
131         FALSE               20  1.00000000 2003        2003-10-04
132         FALSE               20  1.00000000 2004        2004-10-02
133         FALSE               19  1.00000000 2005        2005-10-01
134         FALSE               20  1.00000000 2006        2006-09-30
135         FALSE                4  0.33333333 2007        2007-09-29
136         FALSE               21  1.00000000 2015        2015-10-03
137         FALSE                1  0.07692308 1980        1980-11-15
138         FALSE               20  1.00000000 1981        1981-10-03
139          TRUE               13  1.00000000 1980        1980-11-15
140         FALSE               20  1.00000000 1990        1990-09-29
141         FALSE               20  1.00000000 1991        1991-09-28
142         FALSE               20  1.00000000 1992        1992-09-26
143         FALSE               21  1.00000000 2012        2012-09-15
144         FALSE               13  1.00000000 1980        1980-11-15
145         FALSE               20  1.00000000 2004        2004-10-02
146         FALSE               20  1.00000000 2001        2001-09-29
147         FALSE               20  1.00000000 2002        2002-10-05
148         FALSE               10  0.50000000 2003        2003-10-04
149         FALSE               21  1.00000000 2017        2017-09-30
150         FALSE               21  1.00000000 2018        2018-09-29
151         FALSE               18  1.00000000 2019        2019-09-28
152         FALSE               17  1.00000000 2020        2020-10-03
153         FALSE               24  1.00000000 1975        1975-10-11
154         FALSE               22  1.00000000 1976        1976-09-18
155         FALSE               20  1.00000000 1977        1977-09-24
156         FALSE               20  1.00000000 1978        1978-10-07
157         FALSE               20  1.00000000 1979        1979-10-13
158         FALSE               20  1.00000000 1995        1995-09-30
159         FALSE               20  1.00000000 1996        1996-09-28
160          TRUE               20  1.00000000 1997        1997-09-27
161          TRUE               19  1.00000000 1998        1998-09-26
162          TRUE               20  1.00000000 1999        1999-10-02
163         FALSE               18  1.00000000 1985        1985-11-09
164         FALSE                1  0.07692308 1980        1980-11-15
165         FALSE               20  1.00000000 2001        2001-09-29
166         FALSE               20  1.00000000 2002        2002-10-05
167         FALSE               20  1.00000000 2003        2003-10-04
168          TRUE               20  1.00000000 2004        2004-10-02
169          TRUE               19  1.00000000 2005        2005-10-01
170          TRUE               20  1.00000000 2006        2006-09-30
171          TRUE               12  1.00000000 2007        2007-09-29
172          TRUE               11  0.50000000 2008        2008-09-13
173         FALSE               13  1.00000000 1980        1980-11-15
174         FALSE               20  1.00000000 1981        1981-10-03
175         FALSE               20  1.00000000 1982        1982-09-25
176         FALSE               19  1.00000000 1983        1983-10-08
177         FALSE               22  1.00000000 2010        2010-09-25
178         FALSE               22  1.00000000 2011        2011-09-24
179         FALSE               21  1.00000000 2012        2012-09-15
180         FALSE               21  1.00000000 2013        2013-09-28
181         FALSE               21  1.00000000 2014        2014-09-27
182         FALSE               21  1.00000000 2015        2015-10-03
183         FALSE               22  1.00000000 2009        2009-09-26
184         FALSE               22  1.00000000 2010        2010-09-25
185         FALSE               22  1.00000000 2011        2011-09-24
186         FALSE               21  1.00000000 2012        2012-09-15
187         FALSE               21  1.00000000 2013        2013-09-28
188         FALSE               19  1.00000000 1998        1998-09-26
189         FALSE               20  1.00000000 1999        1999-10-02
190         FALSE               20  1.00000000 2000        2000-10-07
191         FALSE                8  0.40000000 2001        2001-09-29
192         FALSE               20  1.00000000 2002        2002-10-05
193         FALSE               20  1.00000000 2003        2003-10-04
194         FALSE               20  1.00000000 2004        2004-10-02
195         FALSE               19  1.00000000 2005        2005-10-01
196         FALSE               20  1.00000000 1995        1995-09-30
197         FALSE               20  1.00000000 1996        1996-09-28
198         FALSE               20  1.00000000 1997        1997-09-27
199         FALSE               19  1.00000000 1998        1998-09-26
200         FALSE               20  1.00000000 1999        1999-10-02
201         FALSE                4  0.16666667 1975        1975-10-11
202         FALSE               21  1.00000000 2013        2013-09-28
203         FALSE               21  1.00000000 2018        2018-09-29
204         FALSE               18  1.00000000 2019        2019-09-28
205         FALSE               17  1.00000000 2020        2020-10-03
206         FALSE               21  1.00000000 2017        2017-09-30
207         FALSE               20  1.00000000 1979        1979-10-13
208         FALSE               18  1.00000000 1985        1985-11-09
209         FALSE               24  1.00000000 1975        1975-10-11
210         FALSE               22  1.00000000 1976        1976-09-18
211         FALSE               20  1.00000000 1977        1977-09-24
212         FALSE               20  1.00000000 1978        1978-10-07
213         FALSE               20  1.00000000 1979        1979-10-13
214         FALSE               20  1.00000000 1986        1986-10-11
215         FALSE               13  1.00000000 1987        1987-10-17
216         FALSE               20  1.00000000 1988        1988-10-08
217         FALSE               20  1.00000000 1989        1989-09-30
218         FALSE               20  1.00000000 1990        1990-09-29
219          TRUE               20  1.00000000 1991        1991-09-28
220          TRUE               20  1.00000000 1992        1992-09-26
221          TRUE               20  1.00000000 1993        1993-09-25
222         FALSE               20  1.00000000 1994        1994-09-24
223         FALSE               11  0.55000000 1988        1988-10-08
224         FALSE               20  1.00000000 1989        1989-09-30
225         FALSE               20  1.00000000 1990        1990-09-29
226         FALSE               20  1.00000000 1991        1991-09-28
227         FALSE               20  1.00000000 1992        1992-09-26
228         FALSE               20  1.00000000 1993        1993-09-25
229         FALSE               11  0.55000000 1994        1994-09-24
230         FALSE               12  0.54545455 1976        1976-09-18
231         FALSE               20  1.00000000 1977        1977-09-24
232          TRUE               20  1.00000000 1978        1978-10-07
233          TRUE               20  1.00000000 1979        1979-10-13
234         FALSE               10  0.76923077 1980        1980-11-15
235         FALSE               20  1.00000000 1981        1981-10-03
236         FALSE               20  1.00000000 1982        1982-09-25
237         FALSE               14  0.73684211 1983        1983-10-08
238         FALSE               22  1.00000000 2008        2008-09-13
239         FALSE               22  1.00000000 2009        2009-09-26
240         FALSE               22  1.00000000 2010        2010-09-25
241         FALSE               22  1.00000000 2011        2011-09-24
242         FALSE               21  1.00000000 2012        2012-09-15
243         FALSE               21  1.00000000 2013        2013-09-28
244         FALSE               21  1.00000000 2014        2014-09-27
245         FALSE               21  1.00000000 2015        2015-10-03
246         FALSE               21  1.00000000 2016        2016-10-01
247         FALSE               24  1.00000000 1975        1975-10-11
248         FALSE               22  1.00000000 1976        1976-09-18
249         FALSE               20  1.00000000 1977        1977-09-24
250         FALSE               20  1.00000000 1978        1978-10-07
251         FALSE               20  1.00000000 1979        1979-10-13
252         FALSE               20  1.00000000 1996        1996-09-28
253         FALSE               20  1.00000000 1997        1997-09-27
254         FALSE               19  1.00000000 1998        1998-09-26
255         FALSE               20  1.00000000 1999        1999-10-02
256         FALSE               20  1.00000000 2000        2000-10-07
257         FALSE               20  1.00000000 2001        2001-09-29
258         FALSE               20  1.00000000 2002        2002-10-05
259         FALSE               21  1.00000000 2013        2013-09-28
260         FALSE               21  1.00000000 2014        2014-09-27
261         FALSE               21  1.00000000 2015        2015-10-03
262         FALSE               21  1.00000000 2016        2016-10-01
263         FALSE               21  1.00000000 2017        2017-09-30
264         FALSE               21  1.00000000 2018        2018-09-29
265         FALSE               18  1.00000000 2019        2019-09-28
266         FALSE               17  1.00000000 2020        2020-10-03
267         FALSE               18  0.90000000 1993        1993-09-25
268         FALSE               20  1.00000000 1994        1994-09-24
269         FALSE               21  1.00000000 2016        2016-10-01
270         FALSE               21  1.00000000 2017        2017-09-30
271         FALSE               21  1.00000000 2018        2018-09-29
272         FALSE               18  1.00000000 2019        2019-09-28
273         FALSE               17  1.00000000 2020        2020-10-03
274         FALSE               20  1.00000000 2003        2003-10-04
275         FALSE               20  1.00000000 2004        2004-10-02
276         FALSE               19  1.00000000 2005        2005-10-01
277         FALSE               20  1.00000000 2000        2000-10-07
278          TRUE               18  1.00000000 1985        1985-11-09
279          TRUE               20  1.00000000 1986        1986-10-11
280          TRUE               13  1.00000000 1987        1987-10-17
281          TRUE               20  1.00000000 1988        1988-10-08
282          TRUE               20  1.00000000 1989        1989-09-30
283          TRUE               20  1.00000000 1990        1990-09-29
284         FALSE               21  1.00000000 2013        2013-09-28
285         FALSE               20  1.00000000 2001        2001-09-29
286         FALSE               20  1.00000000 2002        2002-10-05
287         FALSE               20  1.00000000 2003        2003-10-04
288         FALSE               20  1.00000000 2004        2004-10-02
289         FALSE               19  1.00000000 2005        2005-10-01
290          TRUE               20  1.00000000 2006        2006-09-30
291          TRUE               12  1.00000000 2007        2007-09-29
292          TRUE               22  1.00000000 2008        2008-09-13
293          TRUE               22  1.00000000 2009        2009-09-26
294          TRUE               22  1.00000000 2010        2010-09-25
295          TRUE               22  1.00000000 2011        2011-09-24
296          TRUE               21  1.00000000 2012        2012-09-15
297          TRUE               13  0.61904762 2013        2013-09-28
298         FALSE                1  0.07692308 1980        1980-11-15
299         FALSE                9  0.45000000 1990        1990-09-29
300         FALSE               20  1.00000000 1991        1991-09-28
301         FALSE               20  1.00000000 1992        1992-09-26
302         FALSE               20  1.00000000 1993        1993-09-25
303         FALSE               20  1.00000000 1994        1994-09-24
304         FALSE               20  1.00000000 1995        1995-09-30
305         FALSE               20  1.00000000 1996        1996-09-28
306         FALSE               20  1.00000000 1997        1997-09-27
307         FALSE               19  1.00000000 1998        1998-09-26
308         FALSE               20  1.00000000 1999        1999-10-02
309         FALSE                5  0.22727273 2011        2011-09-24
310         FALSE               21  1.00000000 2012        2012-09-15
311         FALSE               21  1.00000000 2013        2013-09-28
312         FALSE               21  1.00000000 2014        2014-09-27
313         FALSE               21  1.00000000 2015        2015-10-03
314         FALSE               21  1.00000000 2016        2016-10-01
315         FALSE               21  1.00000000 2017        2017-09-30
316         FALSE               21  1.00000000 2018        2018-09-29
317         FALSE               18  1.00000000 2019        2019-09-28
318         FALSE               17  1.00000000 2020        2020-10-03
319         FALSE               11  0.55000000 1994        1994-09-24
320         FALSE               20  1.00000000 1995        1995-09-30
321         FALSE               20  1.00000000 1996        1996-09-28
322         FALSE                6  0.30000000 1993        1993-09-25
323         FALSE               20  1.00000000 1994        1994-09-24
324          TRUE               13  1.00000000 1980        1980-11-15
325         FALSE               19  0.95000000 1993        1993-09-25
326          TRUE               20  1.00000000 1994        1994-09-24
327          TRUE               20  1.00000000 1995        1995-09-30
328          TRUE               20  1.00000000 1996        1996-09-28
329          TRUE               16  0.80000000 1997        1997-09-27
330         FALSE               18  1.00000000 1985        1985-11-09
331         FALSE               20  1.00000000 1986        1986-10-11
332         FALSE               13  1.00000000 1987        1987-10-17
333         FALSE               20  1.00000000 1988        1988-10-08
334         FALSE               20  1.00000000 1989        1989-09-30
335         FALSE               20  1.00000000 1982        1982-09-25
336         FALSE               19  1.00000000 1983        1983-10-08
337         FALSE               17  1.00000000 1984        1984-10-06
338         FALSE               10  0.76923077 1980        1980-11-15
339         FALSE               20  1.00000000 1982        1982-09-25
340         FALSE               19  1.00000000 1983        1983-10-08
341         FALSE               17  1.00000000 1984        1984-10-06
342         FALSE               20  1.00000000 1995        1995-09-30
343         FALSE               22  1.00000000 2010        2010-09-25
344         FALSE               22  1.00000000 2011        2011-09-24
345         FALSE               21  1.00000000 2012        2012-09-15
346         FALSE               21  1.00000000 2013        2013-09-28
347         FALSE               21  1.00000000 2014        2014-09-27
348         FALSE               21  1.00000000 2015        2015-10-03
349         FALSE               20  1.00000000 1994        1994-09-24
350         FALSE                1  0.07692308 1980        1980-11-15
351         FALSE               20  1.00000000 1981        1981-10-03
352         FALSE               20  1.00000000 1982        1982-09-25
353         FALSE               19  1.00000000 1983        1983-10-08
354         FALSE                6  0.30000000 1995        1995-09-30
355         FALSE               20  1.00000000 1996        1996-09-28
356         FALSE               20  1.00000000 1997        1997-09-27
357         FALSE               19  1.00000000 1998        1998-09-26
358         FALSE               20  1.00000000 1999        1999-10-02
359         FALSE               20  1.00000000 2000        2000-10-07
360         FALSE               20  1.00000000 2001        2001-09-29
361         FALSE               20  1.00000000 2002        2002-10-05
362          TRUE                8  0.38095238 2013        2013-09-28
363          TRUE               21  1.00000000 2014        2014-09-27
364          TRUE               21  1.00000000 2015        2015-10-03
365          TRUE               21  1.00000000 2016        2016-10-01
366          TRUE               21  1.00000000 2017        2017-09-30
367          TRUE               21  1.00000000 2018        2018-09-29
368          TRUE               18  1.00000000 2019        2019-09-28
369          TRUE               17  1.00000000 2020        2020-10-03
370         FALSE               18  0.85714286 2014        2014-09-27
371         FALSE               21  1.00000000 2015        2015-10-03
372         FALSE               21  1.00000000 2016        2016-10-01
373         FALSE               21  1.00000000 2017        2017-09-30
374         FALSE               21  1.00000000 2018        2018-09-29
375         FALSE               17  1.00000000 2020        2020-10-03
376         FALSE               20  1.00000000 1986        1986-10-11
377         FALSE               13  1.00000000 1987        1987-10-17
378         FALSE               20  1.00000000 1988        1988-10-08
379         FALSE               20  1.00000000 1989        1989-09-30
380         FALSE               20  1.00000000 1990        1990-09-29
381         FALSE               20  1.00000000 1991        1991-09-28
382         FALSE               15  0.75000000 1991        1991-09-28
383         FALSE               20  1.00000000 1992        1992-09-26
384         FALSE               20  1.00000000 1993        1993-09-25
385         FALSE                9  0.69230769 1980        1980-11-15
386         FALSE               20  1.00000000 1986        1986-10-11
387         FALSE               13  1.00000000 1987        1987-10-17
388         FALSE               20  1.00000000 1988        1988-10-08
389         FALSE               20  1.00000000 1989        1989-09-30
390         FALSE               20  1.00000000 1990        1990-09-29
391         FALSE               17  1.00000000 2020        2020-10-03
392         FALSE               20  1.00000000 1986        1986-10-11
393         FALSE               13  1.00000000 1987        1987-10-17
394         FALSE               20  1.00000000 1988        1988-10-08
395         FALSE               20  1.00000000 1989        1989-09-30
396         FALSE               20  1.00000000 1990        1990-09-29
397         FALSE               20  1.00000000 1991        1991-09-28
398         FALSE               20  1.00000000 1992        1992-09-26
399         FALSE               20  1.00000000 1993        1993-09-25
400         FALSE               20  1.00000000 1995        1995-09-30
401         FALSE               20  1.00000000 1996        1996-09-28
402         FALSE               20  1.00000000 1997        1997-09-27
403         FALSE               19  1.00000000 1998        1998-09-26
404         FALSE               20  1.00000000 1999        1999-10-02
405         FALSE               20  1.00000000 2000        2000-10-07
406         FALSE               20  1.00000000 2001        2001-09-29
407         FALSE               20  1.00000000 2002        2002-10-05
408         FALSE               20  1.00000000 2003        2003-10-04
409         FALSE               20  1.00000000 2004        2004-10-02
410         FALSE               19  1.00000000 2005        2005-10-01
411         FALSE               20  1.00000000 2006        2006-09-30
412         FALSE               12  1.00000000 2007        2007-09-29
413         FALSE               22  1.00000000 2008        2008-09-13
414         FALSE               17  1.00000000 1984        1984-10-06
415          TRUE               20  1.00000000 1982        1982-09-25
416          TRUE               19  1.00000000 1983        1983-10-08
417         FALSE               18  1.00000000 1985        1985-11-09
418         FALSE               19  1.00000000 2005        2005-10-01
419         FALSE               20  1.00000000 2006        2006-09-30
420         FALSE               12  1.00000000 2007        2007-09-29
421         FALSE               22  1.00000000 2008        2008-09-13
422         FALSE               22  1.00000000 2009        2009-09-26
423         FALSE               22  1.00000000 2010        2010-09-25
424         FALSE               22  1.00000000 2011        2011-09-24
425         FALSE               21  1.00000000 2012        2012-09-15
426          TRUE               17  1.00000000 1984        1984-10-06
427          TRUE               20  1.00000000 1981        1981-10-03
428         FALSE               20  1.00000000 1982        1982-09-25
429         FALSE               19  1.00000000 1983        1983-10-08
430         FALSE               17  1.00000000 1984        1984-10-06
431         FALSE               13  1.00000000 1980        1980-11-15
432         FALSE               20  1.00000000 1996        1996-09-28
433         FALSE               20  1.00000000 1997        1997-09-27
434         FALSE               19  1.00000000 1998        1998-09-26
435         FALSE               20  1.00000000 1999        1999-10-02
436         FALSE               20  1.00000000 2000        2000-10-07
437         FALSE               20  1.00000000 2001        2001-09-29
438         FALSE               14  0.70000000 1994        1994-09-24
439         FALSE               21  1.00000000 2017        2017-09-30
440         FALSE               21  1.00000000 2018        2018-09-29
441         FALSE               18  1.00000000 2019        2019-09-28
442         FALSE               17  1.00000000 2020        2020-10-03
443         FALSE               20  1.00000000 1977        1977-09-24
444         FALSE               20  1.00000000 1978        1978-10-07
445         FALSE               14  0.70000000 1979        1979-10-13
446         FALSE                6  0.33333333 1985        1985-11-09
447         FALSE               20  1.00000000 1988        1988-10-08
448         FALSE               20  1.00000000 1989        1989-09-30
449         FALSE               20  1.00000000 1990        1990-09-29
450         FALSE               20  1.00000000 1991        1991-09-28
451         FALSE               20  1.00000000 1992        1992-09-26
452         FALSE               20  1.00000000 1993        1993-09-25
453         FALSE               20  1.00000000 1994        1994-09-24
454         FALSE               20  1.00000000 2002        2002-10-05
455         FALSE               20  1.00000000 2003        2003-10-04
456         FALSE               20  1.00000000 2004        2004-10-02
457         FALSE               19  1.00000000 2005        2005-10-01
458         FALSE               20  1.00000000 2006        2006-09-30
459         FALSE               12  1.00000000 2007        2007-09-29
460         FALSE               22  1.00000000 2008        2008-09-13
461         FALSE               22  1.00000000 2009        2009-09-26
462         FALSE               18  1.00000000 2019        2019-09-28
463         FALSE               17  1.00000000 2020        2020-10-03
464          TRUE               20  1.00000000 2000        2000-10-07
465          TRUE               20  1.00000000 2001        2001-09-29
466          TRUE               20  1.00000000 2002        2002-10-05
467          TRUE               20  1.00000000 2003        2003-10-04
468          TRUE               20  1.00000000 2004        2004-10-02
469          TRUE               19  1.00000000 2005        2005-10-01
470         FALSE               20  1.00000000 1995        1995-09-30
471         FALSE               20  1.00000000 1996        1996-09-28
472         FALSE               20  1.00000000 1997        1997-09-27
473         FALSE               19  1.00000000 1998        1998-09-26
474         FALSE               20  1.00000000 1999        1999-10-02
475         FALSE               20  1.00000000 2000        2000-10-07
476         FALSE               20  1.00000000 2001        2001-09-29
477         FALSE               20  1.00000000 1990        1990-09-29
478         FALSE               20  1.00000000 1991        1991-09-28
479         FALSE               20  1.00000000 1992        1992-09-26
480         FALSE               20  1.00000000 1993        1993-09-25
481         FALSE               20  1.00000000 1994        1994-09-24
482         FALSE               20  1.00000000 1991        1991-09-28
483         FALSE               19  1.00000000 1998        1998-09-26
484         FALSE               20  1.00000000 1999        1999-10-02
485          TRUE               20  1.00000000 2000        2000-10-07
486          TRUE               20  1.00000000 2001        2001-09-29
487          TRUE               20  1.00000000 2002        2002-10-05
488          TRUE               20  1.00000000 2003        2003-10-04
489         FALSE               20  1.00000000 1994        1994-09-24
490         FALSE               15  0.68181818 2008        2008-09-13
491         FALSE               22  1.00000000 2009        2009-09-26
492         FALSE               22  1.00000000 2010        2010-09-25
493         FALSE               22  1.00000000 2011        2011-09-24
494         FALSE               20  1.00000000 2001        2001-09-29
495         FALSE               20  1.00000000 2002        2002-10-05
496          TRUE               20  1.00000000 1981        1981-10-03
497         FALSE               18  1.00000000 1985        1985-11-09
498         FALSE               20  1.00000000 1986        1986-10-11
499         FALSE               13  1.00000000 1987        1987-10-17
500         FALSE               20  1.00000000 1988        1988-10-08
501         FALSE               20  1.00000000 1989        1989-09-30
502         FALSE                1  0.07692308 1980        1980-11-15
503         FALSE               20  1.00000000 1981        1981-10-03
504         FALSE               20  1.00000000 1982        1982-09-25
505         FALSE               19  1.00000000 1983        1983-10-08
506         FALSE               18  0.90000000 1999        1999-10-02
507         FALSE               20  1.00000000 2000        2000-10-07
508         FALSE               20  1.00000000 2001        2001-09-29
509         FALSE               20  1.00000000 2002        2002-10-05
510         FALSE               20  1.00000000 2003        2003-10-04
511         FALSE               20  1.00000000 2004        2004-10-02
512         FALSE               19  1.00000000 2005        2005-10-01
513         FALSE               12  0.60000000 1979        1979-10-13
514          TRUE               20  1.00000000 1981        1981-10-03
515         FALSE               18  1.00000000 1985        1985-11-09
516         FALSE               12  0.60000000 1979        1979-10-13
517         FALSE               17  1.00000000 2020        2020-10-03
518         FALSE               13  1.00000000 1980        1980-11-15
519         FALSE               21  1.00000000 2016        2016-10-01
520         FALSE               21  1.00000000 2017        2017-09-30
521         FALSE               21  1.00000000 2018        2018-09-29
522         FALSE               18  1.00000000 2019        2019-09-28
523         FALSE               17  1.00000000 2020        2020-10-03
524         FALSE               20  1.00000000 1977        1977-09-24
525         FALSE               20  1.00000000 1978        1978-10-07
526         FALSE               16  0.80000000 1979        1979-10-13
527         FALSE               21  1.00000000 2014        2014-09-27
528         FALSE               21  1.00000000 2015        2015-10-03
529         FALSE               21  1.00000000 2016        2016-10-01
530         FALSE               21  1.00000000 2017        2017-09-30
531         FALSE               21  1.00000000 2018        2018-09-29
532         FALSE               18  1.00000000 2019        2019-09-28
533         FALSE               17  1.00000000 2020        2020-10-03
534         FALSE               18  1.00000000 1985        1985-11-09
535         FALSE               24  1.00000000 1975        1975-10-11
536          TRUE               22  1.00000000 1976        1976-09-18
537          TRUE               20  1.00000000 1977        1977-09-24
538          TRUE               20  1.00000000 1978        1978-10-07
539          TRUE               20  1.00000000 1979        1979-10-13
540         FALSE               17  1.00000000 1984        1984-10-06
541         FALSE                1  0.04166667 1975        1975-10-11
542         FALSE               20  1.00000000 1991        1991-09-28
543         FALSE               20  1.00000000 1992        1992-09-26
544         FALSE               20  1.00000000 1993        1993-09-25
545         FALSE               20  1.00000000 1994        1994-09-24
546          TRUE               21  1.00000000 2014        2014-09-27
547          TRUE               21  1.00000000 2015        2015-10-03
548          TRUE               21  1.00000000 2016        2016-10-01
549          TRUE               21  1.00000000 2017        2017-09-30
550          TRUE               21  1.00000000 2018        2018-09-29
551          TRUE               18  1.00000000 2019        2019-09-28
552          TRUE               17  1.00000000 2020        2020-10-03
553          TRUE               24  1.00000000 1975        1975-10-11
554          TRUE                6  0.27272727 1976        1976-09-18
555         FALSE               20  1.00000000 1986        1986-10-11
556         FALSE               13  1.00000000 1987        1987-10-17
557         FALSE               20  1.00000000 1988        1988-10-08
558         FALSE               20  1.00000000 1989        1989-09-30
559         FALSE               20  1.00000000 1990        1990-09-29
560         FALSE               20  1.00000000 1991        1991-09-28
561         FALSE               12  0.60000000 1992        1992-09-26
562         FALSE               15  0.75000000 1991        1991-09-28
563         FALSE               21  1.00000000 2012        2012-09-15
564         FALSE               21  1.00000000 2013        2013-09-28
565         FALSE               21  1.00000000 2014        2014-09-27
566         FALSE               21  1.00000000 2015        2015-10-03
567         FALSE               21  1.00000000 2016        2016-10-01
568         FALSE               21  1.00000000 2017        2017-09-30
569         FALSE               21  1.00000000 2018        2018-09-29
570         FALSE               18  1.00000000 2019        2019-09-28
571         FALSE               17  1.00000000 2020        2020-10-03
572         FALSE               22  1.00000000 2010        2010-09-25
573         FALSE               12  0.54545455 2011        2011-09-24
574         FALSE               20  1.00000000 1995        1995-09-30
575         FALSE               20  1.00000000 1996        1996-09-28
576         FALSE               20  1.00000000 1997        1997-09-27
577         FALSE               21  1.00000000 2013        2013-09-28
578         FALSE               21  1.00000000 2014        2014-09-27
579         FALSE               21  1.00000000 2015        2015-10-03
580         FALSE               21  1.00000000 2016        2016-10-01
581         FALSE               21  1.00000000 2017        2017-09-30
582         FALSE               21  1.00000000 2018        2018-09-29
583         FALSE               18  1.00000000 2019        2019-09-28
584         FALSE               17  1.00000000 2020        2020-10-03
585         FALSE               24  1.00000000 1975        1975-10-11
586         FALSE               22  1.00000000 1976        1976-09-18
587         FALSE               20  1.00000000 1977        1977-09-24
588         FALSE               20  1.00000000 1978        1978-10-07
589         FALSE               19  1.00000000 1983        1983-10-08
590         FALSE               17  1.00000000 1984        1984-10-06
591         FALSE               22  1.00000000 2010        2010-09-25
592         FALSE               22  1.00000000 2011        2011-09-24
593         FALSE               21  1.00000000 2012        2012-09-15
594         FALSE               21  1.00000000 2013        2013-09-28
595         FALSE               21  1.00000000 2014        2014-09-27
596         FALSE               21  1.00000000 2015        2015-10-03
597         FALSE               21  1.00000000 2016        2016-10-01
598         FALSE                4  0.20000000 1994        1994-09-24
599         FALSE               12  0.60000000 1979        1979-10-13
600         FALSE               24  1.00000000 1975        1975-10-11
601         FALSE               22  1.00000000 1976        1976-09-18
602          TRUE               20  1.00000000 1977        1977-09-24
603         FALSE               20  1.00000000 1978        1978-10-07
604         FALSE               20  1.00000000 2002        2002-10-05
605         FALSE               20  1.00000000 2003        2003-10-04
606         FALSE               20  1.00000000 2004        2004-10-02
607         FALSE               19  1.00000000 2005        2005-10-01
608         FALSE               20  1.00000000 2006        2006-09-30
609         FALSE               12  1.00000000 2007        2007-09-29
610         FALSE               22  1.00000000 2008        2008-09-13
611         FALSE               22  1.00000000 2009        2009-09-26
612         FALSE               22  1.00000000 2010        2010-09-25
613         FALSE               22  1.00000000 2011        2011-09-24
614         FALSE               21  1.00000000 2012        2012-09-15
    last_epid_season n_episodes_season         url    type  gender
1         1986-05-24                18 /Cast/?AWBr    cast    male
2         1987-05-23                20 /Cast/?AWBr    cast    male
3         1988-02-27                13 /Cast/?AWBr    cast    male
4         1989-05-20                20 /Cast/?AWBr    cast    male
5         1990-05-19                20 /Cast/?AWBr    cast    male
6         1991-05-18                20 /Cast/?AWBr    cast    male
7         1980-05-24                20 /Cast/?AlZw    cast    male
8         2014-05-17                21 /Cast/?SaZa    cast  female
9         2015-05-16                21 /Cast/?SaZa    cast  female
10        2016-05-21                21 /Cast/?SaZa    cast  female
11        2017-05-20                21 /Cast/?SaZa    cast  female
12        2020-05-09                18 /Cast/?BoYa    cast    male
13        2021-04-10                17 /Cast/?BoYa    cast    male
14        1996-05-18                20 /Cast/?FrWo    cast    male
15        1997-05-17                20 /Cast/?FrWo    cast    male
16        2008-05-17                12 /Cast/?CaWi    cast  female
17        2009-05-16                22 /Cast/?CaWi    cast  female
18        2006-05-20                19 /Cast/?KrWi    cast  female
19        2007-05-19                20 /Cast/?KrWi    cast  female
20        2008-05-17                12 /Cast/?KrWi    cast  female
21        2009-05-16                22 /Cast/?KrWi    cast  female
22        2010-05-15                22 /Cast/?KrWi    cast  female
23        2011-05-21                22 /Cast/?KrWi    cast  female
24        2012-05-19                22 /Cast/?KrWi    cast  female
25        2014-05-17                21 /Cast/?BrWh    cast    male
26        2014-05-17                21 /Cast/?NoWe    cast  female
27        1981-04-11                13 /Cast/?PaWe    cast    male
28        1986-05-24                18 /Cast/?DaWa    cast    male
29        2009-05-16                22 /Cast/?MiWa    cast  female
30        1996-05-18                20 /Cast/?NaWa    cast  female
31        1986-05-24                18 /Cast/?DaVi    cast    male
32        2017-05-20                21 /Cast/?MeVi    cast  female
33        2018-05-19                21 /Cast/?MeVi    cast  female
34        2019-05-18                21 /Cast/?MeVi    cast  female
35        2020-05-09                18 /Cast/?MeVi    cast  female
36        2021-04-10                17 /Cast/?MeVi    cast  female
37        1986-05-24                18 /Cast/?DaVa    cast  female
38        2004-05-15                20 /Cast/?KeTh    cast    male
39        2005-05-21                20 /Cast/?KeTh    cast    male
40        2006-05-20                19 /Cast/?KeTh    cast    male
41        2007-05-19                20 /Cast/?KeTh    cast    male
42        2008-05-17                12 /Cast/?KeTh    cast    male
43        2009-05-16                22 /Cast/?KeTh    cast    male
44        2010-05-15                22 /Cast/?KeTh    cast    male
45        2011-05-21                22 /Cast/?KeTh    cast    male
46        2012-05-19                22 /Cast/?KeTh    cast    male
47        2013-05-18                21 /Cast/?KeTh    cast    male
48        2014-05-17                21 /Cast/?KeTh    cast    male
49        2015-05-16                21 /Cast/?KeTh    cast    male
50        2016-05-21                21 /Cast/?KeTh    cast    male
51        2017-05-20                21 /Cast/?KeTh    cast    male
52        2018-05-19                21 /Cast/?KeTh    cast    male
53        2019-05-18                21 /Cast/?KeTh    cast    male
54        2020-05-09                18 /Cast/?KeTh    cast    male
55        2021-04-10                17 /Cast/?KeTh    cast    male
56        1986-05-24                18 /Cast/?TeSw    cast    male
57        1991-05-18                20 /Cast/?JuSw    cast  female
58        1992-05-16                20 /Cast/?JuSw    cast  female
59        1993-05-15                20 /Cast/?JuSw    cast  female
60        1994-05-14                20 /Cast/?JuSw    cast  female
61        2005-05-21                20 /Cast/?JaSu    cast    male
62        2006-05-20                19 /Cast/?JaSu    cast    male
63        2007-05-19                20 /Cast/?JaSu    cast    male
64        2008-05-17                12 /Cast/?JaSu    cast    male
65        2009-05-16                22 /Cast/?JaSu    cast    male
66        2010-05-15                22 /Cast/?JaSu    cast    male
67        2011-05-21                22 /Cast/?JaSu    cast    male
68        2012-05-19                22 /Cast/?JaSu    cast    male
69        2013-05-18                21 /Cast/?JaSu    cast    male
70        2013-05-18                21 /Cast/?CeSt    cast  female
71        2014-05-17                21 /Cast/?CeSt    cast  female
72        2015-05-16                21 /Cast/?CeSt    cast  female
73        2016-05-21                21 /Cast/?CeSt    cast  female
74        2017-05-20                21 /Cast/?CeSt    cast  female
75        2018-05-19                21 /Cast/?CeSt    cast  female
76        2019-05-18                21 /Cast/?CeSt    cast  female
77        2020-05-09                18 /Cast/?CeSt    cast  female
78        2021-04-10                17 /Cast/?CeSt    cast  female
79        1989-05-20                20 /Cast/?BeSt    cast    male
80        1985-04-13                17 /Cast/?PaSt    cast  female
81        1991-05-18                20        <NA> unknown    male
82        1992-05-16                20        <NA> unknown    male
83        1993-05-15                20        <NA> unknown    male
84        1994-05-14                20        <NA> unknown    male
85        1995-05-13                20        <NA> unknown    male
86        1996-05-18                20        <NA> unknown    male
87        1992-05-16                20 /Cast/?RoSm    cast    male
88        1993-05-15                20 /Cast/?RoSm    cast    male
89        2010-05-15                22 /Cast/?JeSl    cast  female
90        1994-05-14                20 /Cast/?SaSi    cast  female
91        1985-04-13                17 /Cast/?MaSh    cast    male
92        1980-05-24                20 /Cast/?HaSh    cast    male
93        1985-04-13                17 /Cast/?HaSh    cast    male
94        1995-05-13                20 /Cast/?MoSh    cast  female
95        1996-05-18                20 /Cast/?MoSh    cast  female
96        1997-05-17                20 /Cast/?MoSh    cast  female
97        1998-05-09                20 /Cast/?MoSh    cast  female
98        1999-05-15                19 /Cast/?MoSh    cast  female
99        2000-05-20                20 /Cast/?MoSh    cast  female
100       2001-05-19                20 /Cast/?MoSh    cast  female
101       1980-05-24                20 /Cast/?PaSh    cast    male
102       1991-05-18                20 /Cast/?RoSc    cast    male
103       1992-05-16                20 /Cast/?RoSc    cast    male
104       1993-05-15                20 /Cast/?RoSc    cast    male
105       1994-05-14                20 /Cast/?RoSc    cast    male
106       1980-05-24                20 /Cast/?ToSc    cast    male
107       1999-05-15                19 /Cast/?HrSa    cast    male
108       2000-05-20                20 /Cast/?HrSa    cast    male
109       2001-05-19                20 /Cast/?HrSa    cast    male
110       2002-05-18                20 /Cast/?HrSa    cast    male
111       2003-05-17                20 /Cast/?HrSa    cast    male
112       2004-05-15                20 /Cast/?HrSa    cast    male
113       2005-05-21                20 /Cast/?HrSa    cast    male
114       2006-05-20                19 /Cast/?HrSa    cast    male
115       1991-05-18                20 /Cast/?AdSa    cast    male
116       1992-05-16                20 /Cast/?AdSa    cast    male
117       1993-05-15                20 /Cast/?AdSa    cast    male
118       1994-05-14                20 /Cast/?AdSa    cast    male
119       1995-05-13                20 /Cast/?AdSa    cast    male
120       2006-05-20                19 /Cast/?AnSa    cast    male
121       2007-05-19                20 /Cast/?AnSa    cast    male
122       2008-05-17                12 /Cast/?AnSa    cast    male
123       2009-05-16                22 /Cast/?AnSa    cast    male
124       2010-05-15                22 /Cast/?AnSa    cast    male
125       2011-05-21                22 /Cast/?AnSa    cast    male
126       2012-05-19                22 /Cast/?AnSa    cast    male
127       2000-05-20                20 /Cast/?MaRu    cast  female
128       2001-05-19                20 /Cast/?MaRu    cast  female
129       2002-05-18                20 /Cast/?MaRu    cast  female
130       2003-05-17                20 /Cast/?MaRu    cast  female
131       2004-05-15                20 /Cast/?MaRu    cast  female
132       2005-05-21                20 /Cast/?MaRu    cast  female
133       2006-05-20                19 /Cast/?MaRu    cast  female
134       2007-05-19                20 /Cast/?MaRu    cast  female
135       2008-05-17                12 /Cast/?MaRu    cast  female
136       2016-05-21                21 /Cast/?JoRu    cast    male
137       1981-04-11                13 /Cast/?ToRo    cast    male
138       1982-05-22                20 /Cast/?ToRo    cast    male
139       1981-04-11                13 /Cast/?CaRo    cast    male
140       1991-05-18                20 /Cast/?ChRo    cast    male
141       1992-05-16                20 /Cast/?ChRo    cast    male
142       1993-05-15                20 /Cast/?ChRo    cast    male
143       2013-05-18                21 /Cast/?TiRo    cast    male
144       1981-04-11                13 /Cast/?AnRi    cast  female
145       2005-05-21                20 /Cast/?RoRi    cast    male
146       2002-05-18                20 /Cast/?JeRi    cast    male
147       2003-05-17                20 /Cast/?JeRi    cast    male
148       2004-05-15                20 /Cast/?JeRi    cast    male
149       2018-05-19                21 /Cast/?ChRe    cast    male
150       2019-05-18                21 /Cast/?ChRe    cast    male
151       2020-05-09                18 /Cast/?ChRe    cast    male
152       2021-04-10                17 /Cast/?ChRe    cast    male
153       1976-07-31                24 /Cast/?GiRa    cast  female
154       1977-05-21                22 /Cast/?GiRa    cast  female
155       1978-05-20                20 /Cast/?GiRa    cast  female
156       1979-05-26                20 /Cast/?GiRa    cast  female
157       1980-05-24                20 /Cast/?GiRa    cast  female
158       1996-05-18                20 /Cast/?CoQu    cast    male
159       1997-05-17                20 /Cast/?CoQu    cast    male
160       1998-05-09                20 /Cast/?CoQu    cast    male
161       1999-05-15                19 /Cast/?CoQu    cast    male
162       2000-05-20                20 /Cast/?CoQu    cast    male
163       1986-05-24                18 /Cast/?RaQu    cast    male
164       1981-04-11                13 /Cast/?EmPr    cast  female
165       2002-05-18                20 /Cast/?AmPo    cast  female
166       2003-05-17                20 /Cast/?AmPo    cast  female
167       2004-05-15                20 /Cast/?AmPo    cast  female
168       2005-05-21                20 /Cast/?AmPo    cast  female
169       2006-05-20                19 /Cast/?AmPo    cast  female
170       2007-05-19                20 /Cast/?AmPo    cast  female
171       2008-05-17                12 /Cast/?AmPo    cast  female
172       2009-05-16                22 /Cast/?AmPo    cast  female
173       1981-04-11                13 /Cast/?JoPi    cast    male
174       1982-05-22                20 /Cast/?JoPi    cast    male
175       1983-05-14                20 /Cast/?JoPi    cast    male
176       1984-05-12                19 /Cast/?JoPi    cast    male
177       2011-05-21                22 /Cast/?JaPh    cast    male
178       2012-05-19                22 /Cast/?JaPh    cast    male
179       2013-05-18                21 /Cast/?JaPh    cast    male
180       2014-05-17                21 /Cast/?JaPh    cast    male
181       2015-05-16                21 /Cast/?JaPh    cast    male
182       2016-05-21                21 /Cast/?JaPh    cast    male
183       2010-05-15                22 /Cast/?NaPe    cast  female
184       2011-05-21                22 /Cast/?NaPe    cast  female
185       2012-05-19                22 /Cast/?NaPe    cast  female
186       2013-05-18                21 /Cast/?NaPe    cast  female
187       2014-05-17                21 /Cast/?NaPe    cast  female
188       1999-05-15                19 /Cast/?ChPa    cast    male
189       2000-05-20                20 /Cast/?ChPa    cast    male
190       2001-05-19                20 /Cast/?ChPa    cast    male
191       2002-05-18                20 /Cast/?ChPa    cast    male
192       2003-05-17                20 /Cast/?ChPa    cast    male
193       2004-05-15                20 /Cast/?ChPa    cast    male
194       2005-05-21                20 /Cast/?ChPa    cast    male
195       2006-05-20                19 /Cast/?ChPa    cast    male
196       1996-05-18                20 /Cast/?ChOt    cast  female
197       1997-05-17                20 /Cast/?ChOt    cast  female
198       1998-05-09                20 /Cast/?ChOt    cast  female
199       1999-05-15                19 /Cast/?ChOt    cast  female
200       2000-05-20                20 /Cast/?ChOt    cast  female
201       1976-07-31                24 /Cast/?MiOD    cast    male
202       2014-05-17                21 /Cast/?MPOB    cast    male
203       2019-05-18                21 /Cast/?EgNw    cast unknown
204       2020-05-09                18 /Cast/?EgNw    cast unknown
205       2021-04-10                17 /Cast/?EgNw    cast unknown
206       2018-05-19                21 /Cast/?LuNu    cast    male
207       1980-05-24                20 /Cast/?DoNo    cast    male
208       1986-05-24                18 /Cast/?DoNo    cast    male
209       1976-07-31                24 /Cast/?LaNe    cast  female
210       1977-05-21                22 /Cast/?LaNe    cast  female
211       1978-05-20                20 /Cast/?LaNe    cast  female
212       1979-05-26                20 /Cast/?LaNe    cast  female
213       1980-05-24                20 /Cast/?LaNe    cast  female
214       1987-05-23                20 /Cast/?KeNe    cast    male
215       1988-02-27                13 /Cast/?KeNe    cast    male
216       1989-05-20                20 /Cast/?KeNe    cast    male
217       1990-05-19                20 /Cast/?KeNe    cast    male
218       1991-05-18                20 /Cast/?KeNe    cast    male
219       1992-05-16                20 /Cast/?KeNe    cast    male
220       1993-05-15                20 /Cast/?KeNe    cast    male
221       1994-05-14                20 /Cast/?KeNe    cast    male
222       1995-05-13                20 /Cast/?KeNe    cast    male
223       1989-05-20                20 /Cast/?MiMy    cast    male
224       1990-05-19                20 /Cast/?MiMy    cast    male
225       1991-05-18                20 /Cast/?MiMy    cast    male
226       1992-05-16                20 /Cast/?MiMy    cast    male
227       1993-05-15                20 /Cast/?MiMy    cast    male
228       1994-05-14                20 /Cast/?MiMy    cast    male
229       1995-05-13                20 /Cast/?MiMy    cast    male
230       1977-05-21                22 /Cast/?BiMu    cast    male
231       1978-05-20                20 /Cast/?BiMu    cast    male
232       1979-05-26                20 /Cast/?BiMu    cast    male
233       1980-05-24                20 /Cast/?BiMu    cast    male
234       1981-04-11                13 /Cast/?EdMu    cast    male
235       1982-05-22                20 /Cast/?EdMu    cast    male
236       1983-05-14                20 /Cast/?EdMu    cast    male
237       1984-05-12                19 /Cast/?EdMu    cast    male
238       2009-05-16                22 /Cast/?BoMo    cast    male
239       2010-05-15                22 /Cast/?BoMo    cast    male
240       2011-05-21                22 /Cast/?BoMo    cast    male
241       2012-05-19                22 /Cast/?BoMo    cast    male
242       2013-05-18                21 /Cast/?BoMo    cast    male
243       2014-05-17                21 /Cast/?BoMo    cast    male
244       2015-05-16                21 /Cast/?BoMo    cast    male
245       2016-05-21                21 /Cast/?BoMo    cast    male
246       2017-05-20                21 /Cast/?BoMo    cast    male
247       1976-07-31                24 /Cast/?GaMo    cast    male
248       1977-05-21                22 /Cast/?GaMo    cast    male
249       1978-05-20                20 /Cast/?GaMo    cast    male
250       1979-05-26                20 /Cast/?GaMo    cast    male
251       1980-05-24                20 /Cast/?GaMo    cast    male
252       1997-05-17                20 /Cast/?TrMo    cast    male
253       1998-05-09                20 /Cast/?TrMo    cast    male
254       1999-05-15                19 /Cast/?TrMo    cast    male
255       2000-05-20                20 /Cast/?TrMo    cast    male
256       2001-05-19                20 /Cast/?TrMo    cast    male
257       2002-05-18                20 /Cast/?TrMo    cast    male
258       2003-05-17                20 /Cast/?TrMo    cast    male
259       2014-05-17                21 /Cast/?KyMo    cast    male
260       2015-05-16                21 /Cast/?KyMo    cast    male
261       2016-05-21                21 /Cast/?KyMo    cast    male
262       2017-05-20                21 /Cast/?KyMo    cast    male
263       2018-05-19                21 /Cast/?KyMo    cast    male
264       2019-05-18                21 /Cast/?KyMo    cast    male
265       2020-05-09                18 /Cast/?KyMo    cast    male
266       2021-04-10                17 /Cast/?KyMo    cast    male
267       1994-05-14                20 /Cast/?JaMo    cast    male
268       1995-05-13                20 /Cast/?JaMo    cast    male
269       2017-05-20                21 /Cast/?AlMo    cast    male
270       2018-05-19                21 /Cast/?AlMo    cast    male
271       2019-05-18                21 /Cast/?AlMo    cast    male
272       2020-05-09                18 /Cast/?AlMo    cast    male
273       2021-04-10                17 /Cast/?AlMo    cast    male
274       2004-05-15                20 /Cast/?FiMi    cast    male
275       2005-05-21                20 /Cast/?FiMi    cast    male
276       2006-05-20                19 /Cast/?FiMi    cast    male
277       2001-05-19                20 /Cast/?JeMi    cast    male
278       1986-05-24                18 /Cast/?DeMi    cast    male
279       1987-05-23                20 /Cast/?DeMi    cast    male
280       1988-02-27                13 /Cast/?DeMi    cast    male
281       1989-05-20                20 /Cast/?DeMi    cast    male
282       1990-05-19                20 /Cast/?DeMi    cast    male
283       1991-05-18                20 /Cast/?DeMi    cast    male
284       2014-05-17                21 /Cast/?JoMi    cast    male
285       2002-05-18                20 /Cast/?SeMe    cast    male
286       2003-05-17                20 /Cast/?SeMe    cast    male
287       2004-05-15                20 /Cast/?SeMe    cast    male
288       2005-05-21                20 /Cast/?SeMe    cast    male
289       2006-05-20                19 /Cast/?SeMe    cast    male
290       2007-05-19                20 /Cast/?SeMe    cast    male
291       2008-05-17                12 /Cast/?SeMe    cast    male
292       2009-05-16                22 /Cast/?SeMe    cast    male
293       2010-05-15                22 /Cast/?SeMe    cast    male
294       2011-05-21                22 /Cast/?SeMe    cast    male
295       2012-05-19                22 /Cast/?SeMe    cast    male
296       2013-05-18                21 /Cast/?SeMe    cast    male
297       2014-05-17                21 /Cast/?SeMe    cast    male
298       1981-04-11                13 /Cast/?LaMe    cast  female
299       1991-05-18                20 /Cast/?TiMe    cast    male
300       1992-05-16                20 /Cast/?TiMe    cast    male
301       1993-05-15                20 /Cast/?TiMe    cast    male
302       1994-05-14                20 /Cast/?TiMe    cast    male
303       1995-05-13                20 /Cast/?TiMe    cast    male
304       1996-05-18                20 /Cast/?TiMe    cast    male
305       1997-05-17                20 /Cast/?TiMe    cast    male
306       1998-05-09                20 /Cast/?TiMe    cast    male
307       1999-05-15                19 /Cast/?TiMe    cast    male
308       2000-05-20                20 /Cast/?TiMe    cast    male
309       2012-05-19                22 /Cast/?KaMc    cast  female
310       2013-05-18                21 /Cast/?KaMc    cast  female
311       2014-05-17                21 /Cast/?KaMc    cast  female
312       2015-05-16                21 /Cast/?KaMc    cast  female
313       2016-05-21                21 /Cast/?KaMc    cast  female
314       2017-05-20                21 /Cast/?KaMc    cast  female
315       2018-05-19                21 /Cast/?KaMc    cast  female
316       2019-05-18                21 /Cast/?KaMc    cast  female
317       2020-05-09                18 /Cast/?KaMc    cast  female
318       2021-04-10                17 /Cast/?KaMc    cast  female
319       1995-05-13                20 /Cast/?MaMc    cast    male
320       1996-05-18                20 /Cast/?MaMc    cast    male
321       1997-05-17                20 /Cast/?MaMc    cast    male
322       1994-05-14                20 /Cast/?MiMc    cast    male
323       1995-05-13                20 /Cast/?MiMc    cast    male
324       1981-04-11                13 /Cast/?GaMa    cast  female
325       1994-05-14                20 /Cast/?NoMa    cast    male
326       1995-05-13                20 /Cast/?NoMa    cast    male
327       1996-05-18                20 /Cast/?NoMa    cast    male
328       1997-05-17                20 /Cast/?NoMa    cast    male
329       1998-05-09                20 /Cast/?NoMa    cast    male
330       1986-05-24                18 /Cast/?JoLo    cast    male
331       1987-05-23                20 /Cast/?JoLo    cast    male
332       1988-02-27                13 /Cast/?JoLo    cast    male
333       1989-05-20                20 /Cast/?JoLo    cast    male
334       1990-05-19                20 /Cast/?JoLo    cast    male
335       1983-05-14                20 /Cast/?JuLD    cast  female
336       1984-05-12                19 /Cast/?JuLD    cast  female
337       1985-04-13                17 /Cast/?JuLD    cast  female
338       1981-04-11                13 /Cast/?MaLa    cast    male
339       1983-05-14                20 /Cast/?GaKr    cast    male
340       1984-05-12                19 /Cast/?GaKr    cast    male
341       1985-04-13                17 /Cast/?GaKr    cast    male
342       1996-05-18                20 /Cast/?DaKo    cast    male
343       2011-05-21                22 /Cast/?TaKi    cast    male
344       2012-05-19                22 /Cast/?TaKi    cast    male
345       2013-05-18                21 /Cast/?TaKi    cast    male
346       2014-05-17                21 /Cast/?TaKi    cast    male
347       2015-05-16                21 /Cast/?TaKi    cast    male
348       2016-05-21                21 /Cast/?TaKi    cast    male
349       1995-05-13                20 /Cast/?LaKi    cast  female
350       1981-04-11                13 /Cast/?TiKa    cast    male
351       1982-05-22                20 /Cast/?TiKa    cast    male
352       1983-05-14                20 /Cast/?TiKa    cast    male
353       1984-05-12                19 /Cast/?TiKa    cast    male
354       1996-05-18                20 /Cast/?ChKa    cast    male
355       1997-05-17                20 /Cast/?ChKa    cast    male
356       1998-05-09                20 /Cast/?ChKa    cast    male
357       1999-05-15                19 /Cast/?ChKa    cast    male
358       2000-05-20                20 /Cast/?ChKa    cast    male
359       2001-05-19                20 /Cast/?ChKa    cast    male
360       2002-05-18                20 /Cast/?ChKa    cast    male
361       2003-05-17                20 /Cast/?ChKa    cast    male
362       2014-05-17                21 /Cast/?CoJo    cast    male
363       2015-05-16                21 /Cast/?CoJo    cast    male
364       2016-05-21                21 /Cast/?CoJo    cast    male
365       2017-05-20                21 /Cast/?CoJo    cast    male
366       2018-05-19                21 /Cast/?CoJo    cast    male
367       2019-05-18                21 /Cast/?CoJo    cast    male
368       2020-05-09                18 /Cast/?CoJo    cast    male
369       2021-04-10                17 /Cast/?CoJo    cast    male
370       2015-05-16                21 /Cast/?LeJo    cast  female
371       2016-05-21                21 /Cast/?LeJo    cast  female
372       2017-05-20                21 /Cast/?LeJo    cast  female
373       2018-05-19                21 /Cast/?LeJo    cast  female
374       2019-05-18                21 /Cast/?LeJo    cast  female
375       2021-04-10                17 /Cast/?PuJo    cast unknown
376       1987-05-23                20 /Cast/?ViJa    cast  female
377       1988-02-27                13 /Cast/?ViJa    cast  female
378       1989-05-20                20 /Cast/?ViJa    cast  female
379       1990-05-19                20 /Cast/?ViJa    cast  female
380       1991-05-18                20 /Cast/?ViJa    cast  female
381       1992-05-16                20 /Cast/?ViJa    cast  female
382       1992-05-16                20 /Cast/?MeHu    cast  female
383       1993-05-15                20 /Cast/?MeHu    cast  female
384       1994-05-14                20 /Cast/?MeHu    cast  female
385       1981-04-11                13 /Cast/?YvHu    cast  female
386       1987-05-23                20 /Cast/?JaHo    cast  female
387       1988-02-27                13 /Cast/?JaHo    cast  female
388       1989-05-20                20 /Cast/?JaHo    cast  female
389       1990-05-19                20 /Cast/?JaHo    cast  female
390       1991-05-18                20 /Cast/?JaHo    cast  female
391       2021-04-10                17 /Cast/?LaHo    cast  female
392       1987-05-23                20 /Cast/?PhHa    cast    male
393       1988-02-27                13 /Cast/?PhHa    cast    male
394       1989-05-20                20 /Cast/?PhHa    cast    male
395       1990-05-19                20 /Cast/?PhHa    cast    male
396       1991-05-18                20 /Cast/?PhHa    cast    male
397       1992-05-16                20 /Cast/?PhHa    cast    male
398       1993-05-15                20 /Cast/?PhHa    cast    male
399       1994-05-14                20 /Cast/?PhHa    cast    male
400       1996-05-18                20 /Cast/?DaHa    cast    male
401       1997-05-17                20 /Cast/?DaHa    cast    male
402       1998-05-09                20 /Cast/?DaHa    cast    male
403       1999-05-15                19 /Cast/?DaHa    cast    male
404       2000-05-20                20 /Cast/?DaHa    cast    male
405       2001-05-19                20 /Cast/?DaHa    cast    male
406       2002-05-18                20 /Cast/?DaHa    cast    male
407       2003-05-17                20 /Cast/?DaHa    cast    male
408       2004-05-15                20 /Cast/?DaHa    cast    male
409       2005-05-21                20 /Cast/?DaHa    cast    male
410       2006-05-20                19 /Cast/?DaHa    cast    male
411       2007-05-19                20 /Cast/?DaHa    cast    male
412       2008-05-17                12 /Cast/?DaHa    cast    male
413       2009-05-16                22 /Cast/?DaHa    cast    male
414       1985-04-13                17 /Cast/?RiHa    cast    male
415       1983-05-14                20 /Cast/?BrHa    cast    male
416       1984-05-12                19 /Cast/?BrHa    cast    male
417       1986-05-24                18 /Cast/?AnMH    cast    male
418       2006-05-20                19 /Cast/?BiHa    cast    male
419       2007-05-19                20 /Cast/?BiHa    cast    male
420       2008-05-17                12 /Cast/?BiHa    cast    male
421       2009-05-16                22 /Cast/?BiHa    cast    male
422       2010-05-15                22 /Cast/?BiHa    cast    male
423       2011-05-21                22 /Cast/?BiHa    cast    male
424       2012-05-19                22 /Cast/?BiHa    cast    male
425       2013-05-18                21 /Cast/?BiHa    cast    male
426       1985-04-13                17 /Cast/?ChGu    cast    male
427       1982-05-22                20 /Cast/?MaGr    cast  female
428       1983-05-14                20 /Cast/?MaGr    cast  female
429       1984-05-12                19 /Cast/?MaGr    cast  female
430       1985-04-13                17 /Cast/?MaGr    cast  female
431       1981-04-11                13        <NA> unknown    male
432       1997-05-17                20 /Cast/?AnGa    cast  female
433       1998-05-09                20 /Cast/?AnGa    cast  female
434       1999-05-15                19 /Cast/?AnGa    cast  female
435       2000-05-20                20 /Cast/?AnGa    cast  female
436       2001-05-19                20 /Cast/?AnGa    cast  female
437       2002-05-18                20 /Cast/?AnGa    cast  female
438       1995-05-13                20 /Cast/?JaGa    cast  female
439       2018-05-19                21 /Cast/?HeGa    cast  female
440       2019-05-18                21 /Cast/?HeGa    cast  female
441       2020-05-09                18 /Cast/?HeGa    cast  female
442       2021-04-10                17 /Cast/?HeGa    cast  female
443       1978-05-20                20 /Cast/?AlFr    cast    male
444       1979-05-26                20 /Cast/?AlFr    cast    male
445       1980-05-24                20 /Cast/?AlFr    cast    male
446       1986-05-24                18 /Cast/?AlFr    cast    male
447       1989-05-20                20 /Cast/?AlFr    cast    male
448       1990-05-19                20 /Cast/?AlFr    cast    male
449       1991-05-18                20 /Cast/?AlFr    cast    male
450       1992-05-16                20 /Cast/?AlFr    cast    male
451       1993-05-15                20 /Cast/?AlFr    cast    male
452       1994-05-14                20 /Cast/?AlFr    cast    male
453       1995-05-13                20 /Cast/?AlFr    cast    male
454       2003-05-17                20 /Cast/?WiFo    cast    male
455       2004-05-15                20 /Cast/?WiFo    cast    male
456       2005-05-21                20 /Cast/?WiFo    cast    male
457       2006-05-20                19 /Cast/?WiFo    cast    male
458       2007-05-19                20 /Cast/?WiFo    cast    male
459       2008-05-17                12 /Cast/?WiFo    cast    male
460       2009-05-16                22 /Cast/?WiFo    cast    male
461       2010-05-15                22 /Cast/?WiFo    cast    male
462       2020-05-09                18 /Cast/?ChFi    cast  female
463       2021-04-10                17 /Cast/?ChFi    cast  female
464       2001-05-19                20 /Cast/?TiFe    cast  female
465       2002-05-18                20 /Cast/?TiFe    cast  female
466       2003-05-17                20 /Cast/?TiFe    cast  female
467       2004-05-15                20 /Cast/?TiFe    cast  female
468       2005-05-21                20 /Cast/?TiFe    cast  female
469       2006-05-20                19 /Cast/?TiFe    cast  female
470       1996-05-18                20 /Cast/?WiFe    cast    male
471       1997-05-17                20 /Cast/?WiFe    cast    male
472       1998-05-09                20 /Cast/?WiFe    cast    male
473       1999-05-15                19 /Cast/?WiFe    cast    male
474       2000-05-20                20 /Cast/?WiFe    cast    male
475       2001-05-19                20 /Cast/?WiFe    cast    male
476       2002-05-18                20 /Cast/?WiFe    cast    male
477       1991-05-18                20 /Cast/?ChFa    cast    male
478       1992-05-16                20 /Cast/?ChFa    cast    male
479       1993-05-15                20 /Cast/?ChFa    cast    male
480       1994-05-14                20 /Cast/?ChFa    cast    male
481       1995-05-13                20 /Cast/?ChFa    cast    male
482       1992-05-16                20 /Cast/?SiFa    cast  female
483       1999-05-15                19 /Cast/?JiFa    cast    male
484       2000-05-20                20 /Cast/?JiFa    cast    male
485       2001-05-19                20 /Cast/?JiFa    cast    male
486       2002-05-18                20 /Cast/?JiFa    cast    male
487       2003-05-17                20 /Cast/?JiFa    cast    male
488       2004-05-15                20 /Cast/?JiFa    cast    male
489       1995-05-13                20 /Cast/?ChEl    cast    male
490       2009-05-16                22 /Cast/?AbEl    cast  female
491       2010-05-15                22 /Cast/?AbEl    cast  female
492       2011-05-21                22 /Cast/?AbEl    cast  female
493       2012-05-19                22 /Cast/?AbEl    cast  female
494       2002-05-18                20 /Cast/?DeEd    cast    male
495       2003-05-17                20 /Cast/?DeEd    cast    male
496       1982-05-22                20 /Cast/?ChEb    cast  female
497       1986-05-24                18 /Cast/?NoDu    cast  female
498       1987-05-23                20 /Cast/?NoDu    cast  female
499       1988-02-27                13 /Cast/?NoDu    cast  female
500       1989-05-20                20 /Cast/?NoDu    cast  female
501       1990-05-19                20 /Cast/?NoDu    cast  female
502       1981-04-11                13 /Cast/?RoDu    cast  female
503       1982-05-22                20 /Cast/?RoDu    cast  female
504       1983-05-14                20 /Cast/?RoDu    cast  female
505       1984-05-12                19 /Cast/?RoDu    cast  female
506       2000-05-20                20 /Cast/?RaDr    cast  female
507       2001-05-19                20 /Cast/?RaDr    cast  female
508       2002-05-18                20 /Cast/?RaDr    cast  female
509       2003-05-17                20 /Cast/?RaDr    cast  female
510       2004-05-15                20 /Cast/?RaDr    cast  female
511       2005-05-21                20 /Cast/?RaDr    cast  female
512       2006-05-20                19 /Cast/?RaDr    cast  female
513       1980-05-24                20 /Cast/?BrDM    cast    male
514       1982-05-22                20 /Cast/?BrDM    cast    male
515       1986-05-24                18 /Cast/?RoDJ    cast    male
516       1980-05-24                20 /Cast/?JiDo    cast    male
517       2021-04-10                17 /Cast/?AnDi    cast    male
518       1981-04-11                13 /Cast/?DeDi    cast    male
519       2017-05-20                21 /Cast/?MiDa    cast    male
520       2018-05-19                21 /Cast/?MiDa    cast    male
521       2019-05-18                21 /Cast/?MiDa    cast    male
522       2020-05-09                18 /Cast/?MiDa    cast    male
523       2021-04-10                17 /Cast/?MiDa    cast    male
524       1978-05-20                20 /Cast/?ToDa    cast    male
525       1979-05-26                20 /Cast/?ToDa    cast    male
526       1980-05-24                20 /Cast/?ToDa    cast    male
527       2015-05-16                21 /Cast/?PeDa    cast    male
528       2016-05-21                21 /Cast/?PeDa    cast    male
529       2017-05-20                21 /Cast/?PeDa    cast    male
530       2018-05-19                21 /Cast/?PeDa    cast    male
531       2019-05-18                21 /Cast/?PeDa    cast    male
532       2020-05-09                18 /Cast/?PeDa    cast    male
533       2021-04-10                17 /Cast/?PeDa    cast    male
534       1986-05-24                18 /Cast/?JoCu    cast  female
535       1976-07-31                24 /Cast/?JaCu    cast  female
536       1977-05-21                22 /Cast/?JaCu    cast  female
537       1978-05-20                20 /Cast/?JaCu    cast  female
538       1979-05-26                20 /Cast/?JaCu    cast  female
539       1980-05-24                20 /Cast/?JaCu    cast  female
540       1985-04-13                17 /Cast/?BiCr    cast    male
541       1976-07-31                24 /Cast/?GeCo    cast    male
542       1992-05-16                20 /Cast/?ElCl    cast  female
543       1993-05-15                20 /Cast/?ElCl    cast  female
544       1994-05-14                20 /Cast/?ElCl    cast  female
545       1995-05-13                20 /Cast/?ElCl    cast  female
546       2015-05-16                21 /Cast/?MiCh    cast    male
547       2016-05-21                21 /Cast/?MiCh    cast    male
548       2017-05-20                21 /Cast/?MiCh    cast    male
549       2018-05-19                21 /Cast/?MiCh    cast    male
550       2019-05-18                21 /Cast/?MiCh    cast    male
551       2020-05-09                18 /Cast/?MiCh    cast    male
552       2021-04-10                17 /Cast/?MiCh    cast    male
553       1976-07-31                24 /Cast/?ChCh    cast    male
554       1977-05-21                22 /Cast/?ChCh    cast    male
555       1987-05-23                20 /Cast/?DaCa    cast    male
556       1988-02-27                13 /Cast/?DaCa    cast    male
557       1989-05-20                20 /Cast/?DaCa    cast    male
558       1990-05-19                20 /Cast/?DaCa    cast    male
559       1991-05-18                20 /Cast/?DaCa    cast    male
560       1992-05-16                20 /Cast/?DaCa    cast    male
561       1993-05-15                20 /Cast/?DaCa    cast    male
562       1992-05-16                20 /Cast/?BeCa    cast  female
563       2013-05-18                21 /Cast/?AiBr    cast  female
564       2014-05-17                21 /Cast/?AiBr    cast  female
565       2015-05-16                21 /Cast/?AiBr    cast  female
566       2016-05-21                21 /Cast/?AiBr    cast  female
567       2017-05-20                21 /Cast/?AiBr    cast  female
568       2018-05-19                21 /Cast/?AiBr    cast  female
569       2019-05-18                21 /Cast/?AiBr    cast  female
570       2020-05-09                18 /Cast/?AiBr    cast  female
571       2021-04-10                17 /Cast/?AiBr    cast  female
572       2011-05-21                22 /Cast/?PaBr    cast    male
573       2012-05-19                22 /Cast/?PaBr    cast    male
574       1996-05-18                20 /Cast/?JiBr    cast    male
575       1997-05-17                20 /Cast/?JiBr    cast    male
576       1998-05-09                20 /Cast/?JiBr    cast    male
577       2014-05-17                21 /Cast/?BeBe    cast    male
578       2015-05-16                21 /Cast/?BeBe    cast    male
579       2016-05-21                21 /Cast/?BeBe    cast    male
580       2017-05-20                21 /Cast/?BeBe    cast    male
581       2018-05-19                21 /Cast/?BeBe    cast    male
582       2019-05-18                21 /Cast/?BeBe    cast    male
583       2020-05-09                18 /Cast/?BeBe    cast    male
584       2021-04-10                17 /Cast/?BeBe    cast    male
585       1976-07-31                24 /Cast/?JoBe    cast    male
586       1977-05-21                22 /Cast/?JoBe    cast    male
587       1978-05-20                20 /Cast/?JoBe    cast    male
588       1979-05-26                20 /Cast/?JoBe    cast    male
589       1984-05-12                19 /Cast/?JiBe    cast    male
590       1985-04-13                17 /Cast/?JiBe    cast    male
591       2011-05-21                22 /Cast/?VaBa    cast  female
592       2012-05-19                22 /Cast/?VaBa    cast  female
593       2013-05-18                21 /Cast/?VaBa    cast  female
594       2014-05-17                21 /Cast/?VaBa    cast  female
595       2015-05-16                21 /Cast/?VaBa    cast  female
596       2016-05-21                21 /Cast/?VaBa    cast  female
597       2017-05-20                21 /Cast/?VaBa    cast  female
598       1995-05-13                20 /Cast/?MoBa    cast  female
599       1980-05-24                20 /Cast/?PeAy    cast    male
600       1976-07-31                24 /Cast/?DaAy    cast    male
601       1977-05-21                22 /Cast/?DaAy    cast    male
602       1978-05-20                20 /Cast/?DaAy    cast    male
603       1979-05-26                20 /Cast/?DaAy    cast    male
604       2003-05-17                20 /Cast/?FrAr    cast    male
605       2004-05-15                20 /Cast/?FrAr    cast    male
606       2005-05-21                20 /Cast/?FrAr    cast    male
607       2006-05-20                19 /Cast/?FrAr    cast    male
608       2007-05-19                20 /Cast/?FrAr    cast    male
609       2008-05-17                12 /Cast/?FrAr    cast    male
610       2009-05-16                22 /Cast/?FrAr    cast    male
611       2010-05-15                22 /Cast/?FrAr    cast    male
612       2011-05-21                22 /Cast/?FrAr    cast    male
613       2012-05-19                22 /Cast/?FrAr    cast    male
614       2013-05-18                21 /Cast/?FrAr    cast    male

Join Data

inner_join(actor, casts)
Error in is.data.frame(y): object 'casts' not found
inner_join(actorcast, seasons)
Error in inner_join(actorcast, seasons): object 'actorcast' not found
# Group the cast_join data frame by year and gender,
# and summarize the number of rows in each group
plot <- cast_join %>%
  group_by(year, gender) %>%
  summarize(
    n = n()
  )
# Create the plot using the `ggplot()` function
ggplot(plot, aes(fill=gender, y=n, x=year)) +
  # Add a bar chart using the `geom_bar()` function, displaying the raw data values
  geom_bar(stat="identity") + labs(title = "Change in the number of actors by gender") +
  # Set background color to light blue
  theme(panel.background = element_rect(fill = "lightblue"))

The total number of actors on SNL has been increasing, with a particular increase in the number of female actors

# create a new plot using the plot and Use the geom_bar() function to create a bar plot
ggplot(plot, aes(fill=gender, y=n, x=year)) + geom_bar(position="fill", stat="identity") +
  # Using the labs() function to set the plot title
  labs(title = "Change in the proportion of actors by gender")+
  # Set the plot's background color to lightblue
  theme(panel.background = element_rect(fill = "lightblue"))

Since the show began, male actors have comprised more than half of the cast and the proportion of female actors in 2020 is similar to that of 1970

data <- cast_join %>% 
  filter(featured==TRUE) %>%
  group_by(year, gender) %>%
  summarize(
    number = n()
  )
# Using the ggplot() function to create a new plot using the data data frame
ggplot(data, aes(fill=gender, y=number, x=year)) +
  # let's create a bar plot with stat="identity"
  geom_bar(stat="identity") +
  # Using the labs() function to set the plot title here
  labs(title = "Change in the number of featured actors by gender") +
  # Using background color of the plot to light blue
  theme(panel.background = element_rect(fill = "lightblue"))

Until 1990, the majority of featured actors on SNL were male. However, since 1990 there has been an increase in the number of female actors featured on the show.

ac <- full_join(actors, casts, by = "aid")
Error in full_join(actors, casts, by = "aid"): object 'actors' not found
# create a jitter plot of gender vs. type with color based on whether the actor was featured or not
ggplot(ac, aes(`type`, `gender`)) +
  geom_jitter(aes(color = `featured`)) +
  labs(x = "group actor belongs",
       y = "gender of actor",
       title = "gender of actor vs group actor belongs") +
  # add a dark blue background color
  theme(panel.background = element_rect(fill = "lightblue")) +
  # change the font to Arial
  theme(text = element_text(family = "Arial"))
Error in ggplot(ac, aes(type, gender)): object 'ac' not found

I recently conducted an analysis on a dataset that combined information about actors and the groups they are in, along with their gender and whether they were featured or not. I wanted to see if there were any patterns or trends in the data related to these variables. The results of the analysis showed that most featured actors were part of the main cast, which is not surprising. However, there were also some featured actors who were part of an unknown group. When looking at the genders of the actors, there were a significant number of male, female, and unknown gender guests, as well as more male cast members than female cast members. The crew was smaller in size compared to the cast, but most of the crew members were male, just like the cast.

One interesting aspect of the dataset was the inclusion of a gender called andy which was not clearly defined. It is possible that this gender could refer to non-binary or enby individuals, but upon closer examination, it did not seem like the guests with this gender identified as non-binary or used non-binary pronouns. It is possible that andy could mean androgynous, or it could be a placeholder for an unknown gender. If it is the latter, it seems unnecessary to use a specific term like andy instead of the more straightforward unknown. I think I found the combined dataset to be interesting and informative, particularly in regards to the large number of guests in the dataset.

Source Code
---
title: "Challenge 8 Instructions"
author: "Meredith Rolfe"
description: "Joining Data"
date: "08/25/2022"
format:
  html:
    toc: true
    code-copy: true
    code-tools: true
categories:
  - challenge_8
  - railroads
  - snl
  - faostat
  - debt
---

```{r}
#| label: setup
#| warning: false
#| message: false

library(tidyverse)
library(ggplot2)
library(dplyr)
knitr::opts_chunk$set(echo = TRUE, warning=FALSE, message=FALSE)
```

## Challenge Overview

Today's challenge is to:

1)  read in multiple data sets, and describe the data set using both words and any supporting information (e.g., tables, etc)
2)  tidy data (as needed, including sanity checks)
3)  mutate variables as needed (including sanity checks)
4)  join two or more data sets and analyze some aspect of the joined data

(be sure to only include the category tags for the data you use!)

## Read in data

Read in one (or more) of the following datasets, using the correct R package and command.

-   military marriages ⭐⭐
-   faostat ⭐⭐
-   railroads ⭐⭐⭐
-   fed_rate ⭐⭐⭐
-   debt ⭐⭐⭐
-   us_hh ⭐⭐⭐⭐
-   snl ⭐⭐⭐⭐⭐

## Snl data- (snl_actors.csv)

```{r}
actor <- read_csv('./_data/snl_actors.csv')
actor
```

```{r}
cast <- read_csv('./_data/snl_casts.csv')
cast
```

```{r}
season <- read_csv('./_data/snl_seasons.csv')
season
```

### Briefly describe the data

The data set we are looking at contains information about the actors in the TV show Saturday Night Live. Each row in the data set represents one actor, and the 'aid' column is used to uniquely identify each actor. This means that the 'aid' column acts as the primary key for the data set, and no two rows have the same value for this column. In addition to the 'aid' column, there are three other columns in the data set: 'type', 'url', and 'gender'.

The 'type' column describes the type of actor that each row represents. The possible values for this column are 'cast', 'crew', 'guest', and 'unknown'. The 'url' column is a combination of the 'type' column and an additional identifier for the actor. This additional identifier can be anywhere from 1 to 4 characters long and can consist of either letters or numbers, but not both. In some cases, the additional identifier is a 4 character code, while in other cases it is a 4 digit code.

The 'url' column does not contain any duplicate values (excluding missing values), which means that no two actors with a non-missing 'url' value have the same additional identifier. If the 'type' column is missing for a given row, then the 'url' value will also be missing. However, there is one row that does not follow this pattern: ('Jack Handey', NA, 'crew', 'male'). This row has a missing 'url' value, but it does not have an 'unknown' value in the 'type' column.

## Tidy Data (as needed)

```{r}
subset(actor, is.na(url))
```

57 observations are missing a value for the url column, and all of these observations have an unknown value for the type column. Only one of these observations with a missing url value is for the person named "Jack Handey", who is listed as a crew member.

Now we will use subset() function to create a new data frame that contains only the rows of the actor data frame where the url column is NA (missing or null) and the type column is crew-

```{r}
actor %>% 
  subset(is.na(url) & type == "crew") 
```

Let's create a new data frame that contains only the rows of the actor data frame where the gender column is andy-

```{r}
actor %>%
  subset(gender == "andy")
```

```{r}
actor$gender[actor$gender=="andy"] <- "unknown"
actor
```

Here, the gender column of the actor data frame is being updated by replacing the value andy with the value unknown.

Now, we will convert the first_epid and last_epid columns in the season data frame from numeric to Date format-

```{r}
season <- transform(season, 
                         first_epid = as.Date(as.character(first_epid), "%Y%m%d"), 
                         last_epid = as.Date(as.character(last_epid), "%Y%m%d"))

season
```

```{r}
# Convert first_epid and last_epid to date objects
cast <- transform(cast, 
                  first_epid = as.Date(as.character(first_epid), "%Y%m%d"), 
                  last_epid = as.Date(as.character(last_epid), "%Y%m%d"))

# Filter out rows where first_epid or last_epid is NA
cast %>% filter(!is.na(first_epid)|!is.na(last_epid))
```

```{r}
subset(actor, str_detect(url, "/./?."))
```

```{r}
# Join the cast and season data frames using an inner join
cast_join <- cast %>%
  inner_join(season, by = "sid")
# replace the NA with the corresponding value in the first_epid.y column
cast_join$first_epid.x[is.na(cast_join$first_epid.x)] <- cast_join$first_epid.y
# replace the NA with the corresponding value in the last_epid.y column
cast_join$last_epid.x[is.na(cast_join$last_epid.x)] <- cast_join$last_epid.y
# Rename the columns in the cast_join
colnames(cast_join) <- c("aid", "sid", "featured", "first_epid_actor", "last_epid_actor", "upload_anchor", "n_episodes_actor", "%_apperance", "year", "first_epid_season", "last_epid_season", "n_episodes_season")
# Print cast_join
cast_join
```

```{r}
# Join the cast_join and actor data frames on the aid column
cast_join <- cast_join %>% 
             inner_join(actor, by = "aid")
# Print the resulting data frame
cast_join
```

## Join Data

```{r}
inner_join(actor, casts)
```

```{r}
inner_join(actorcast, seasons)
```

```{r}
# Group the cast_join data frame by year and gender,
# and summarize the number of rows in each group
plot <- cast_join %>%
  group_by(year, gender) %>%
  summarize(
    n = n()
  )
# Create the plot using the `ggplot()` function
ggplot(plot, aes(fill=gender, y=n, x=year)) +
  # Add a bar chart using the `geom_bar()` function, displaying the raw data values
  geom_bar(stat="identity") + labs(title = "Change in the number of actors by gender") +
  # Set background color to light blue
  theme(panel.background = element_rect(fill = "lightblue"))

```

The total number of actors on SNL has been increasing, with a particular increase in the number of female actors

```{r}
# create a new plot using the plot and Use the geom_bar() function to create a bar plot
ggplot(plot, aes(fill=gender, y=n, x=year)) + geom_bar(position="fill", stat="identity") +
  # Using the labs() function to set the plot title
  labs(title = "Change in the proportion of actors by gender")+
  # Set the plot's background color to lightblue
  theme(panel.background = element_rect(fill = "lightblue"))
```

Since the show began, male actors have comprised more than half of the cast and the proportion of female actors in 2020 is similar to that of 1970

```{r}
data <- cast_join %>% 
  filter(featured==TRUE) %>%
  group_by(year, gender) %>%
  summarize(
    number = n()
  )
# Using the ggplot() function to create a new plot using the data data frame
ggplot(data, aes(fill=gender, y=number, x=year)) +
  # let's create a bar plot with stat="identity"
  geom_bar(stat="identity") +
  # Using the labs() function to set the plot title here
  labs(title = "Change in the number of featured actors by gender") +
  # Using background color of the plot to light blue
  theme(panel.background = element_rect(fill = "lightblue"))
```

Until 1990, the majority of featured actors on SNL were male. However, since 1990 there has been an increase in the number of female actors featured on the show.

```{r}
ac <- full_join(actors, casts, by = "aid")
# create a jitter plot of gender vs. type with color based on whether the actor was featured or not
ggplot(ac, aes(`type`, `gender`)) +
  geom_jitter(aes(color = `featured`)) +
  labs(x = "group actor belongs",
       y = "gender of actor",
       title = "gender of actor vs group actor belongs") +
  # add a dark blue background color
  theme(panel.background = element_rect(fill = "lightblue")) +
  # change the font to Arial
  theme(text = element_text(family = "Arial"))
```

I recently conducted an analysis on a dataset that combined information about actors and the groups they are in, along with their gender and whether they were featured or not. I wanted to see if there were any patterns or trends in the data related to these variables. The results of the analysis showed that most featured actors were part of the main cast, which is not surprising. However, there were also some featured actors who were part of an unknown group. When looking at the genders of the actors, there were a significant number of male, female, and unknown gender guests, as well as more male cast members than female cast members. The crew was smaller in size compared to the cast, but most of the crew members were male, just like the cast.

One interesting aspect of the dataset was the inclusion of a gender called andy which was not clearly defined. It is possible that this gender could refer to non-binary or enby individuals, but upon closer examination, it did not seem like the guests with this gender identified as non-binary or used non-binary pronouns. It is possible that andy could mean androgynous, or it could be a placeholder for an unknown gender. If it is the latter, it seems unnecessary to use a specific term like andy instead of the more straightforward unknown. I think I found the combined dataset to be interesting and informative, particularly in regards to the large number of guests in the dataset.