https://projects.fivethirtyeight.com/russia-investigation/ The dataset I have chosen for this assignments is a collection of scandals that took place during US presidencies. For this assignment, I chose to compare Watergate to Russiagate, as I found inspiration from the title of the FiveThirtyEight article:“Is the Russia Investigation Really Another Watergate?”

Immediately, we can say no, as both scandals are clearly independent
of each other. But what I found interesting were the differences between those who were sentenced in Watergate and Russiagate: According the graphs on 538, we can clearly see more individuals were indicted, but not convicted, during Russiagate than Watergate. This is exemplified under the “Pleas” section.

PT 1: Loading Data

library(tidyverse)
## Warning: package 'tidyverse' was built under R version 4.0.3
## -- Attaching packages ------------------------------------------------ tidyverse 1.3.0 --
## v ggplot2 3.3.2     v purrr   0.3.4
## v tibble  3.0.3     v dplyr   1.0.0
## v tidyr   1.1.0     v stringr 1.4.0
## v readr   1.3.1     v forcats 0.5.0
## -- Conflicts --------------------------------------------------- tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(openintro)
## Warning: package 'openintro' was built under R version 4.0.3
## Loading required package: airports
## Warning: package 'airports' was built under R version 4.0.3
## Loading required package: cherryblossom
## Warning: package 'cherryblossom' was built under R version 4.0.3
## Loading required package: usdata
## Warning: package 'usdata' was built under R version 4.0.3
library(dplyr)

x <- read.csv("https://raw.githubusercontent.com/fivethirtyeight/data/master/russia-investigation/russia-investigation.csv")
str(x)
## 'data.frame':    194 obs. of  13 variables:
##  $ investigation      : chr  "watergate" "watergate" "watergate" "watergate" ...
##  $ investigation.start: chr  "1973-05-19" "1973-05-19" "1973-05-19" "1973-05-19" ...
##  $ investigation.end  : chr  "1977-06-19" "1977-06-19" "1977-06-19" "1977-06-19" ...
##  $ investigation.days : int  1492 1492 1492 1492 1492 1492 1492 1492 1492 1492 ...
##  $ name               : chr  "James W. McCord" "Bernard L. Barker" "Bernard L. Barker" "Eugenio R. Martinez" ...
##  $ indictment.days    : int  -246 -246 292 -246 292 -246 -246 -246 292 -246 ...
##  $ type               : chr  "conviction" "conviction" "conviction" "guilty-plea" ...
##  $ cp.date            : chr  "1973-01-30" "1973-01-15" "1974-07-12" "1973-01-15" ...
##  $ cp.days            : int  -109 -124 419 -124 419 -124 -124 -109 419 -128 ...
##  $ overturned         : logi  FALSE FALSE TRUE FALSE TRUE FALSE ...
##  $ pardoned           : logi  FALSE FALSE FALSE TRUE FALSE FALSE ...
##  $ american           : logi  TRUE TRUE TRUE TRUE TRUE TRUE ...
##  $ president          : chr  "Richard Nixon" "Richard Nixon" "Richard Nixon" "Richard Nixon" ...

PT 2: Dropping, and renaming columns

data1 <- select(x, -c(indictment.days, cp.date, cp.days, american))
names(data1) <- c("Scandal", "Start Date", "End Date", "Days", "Defendants", "Legality", "Retraction", "Pardoned", "Presidency")

data2 <- names(data1) <- data1
data2
##                           Scandal Start Date   End Date Days
## 1                       watergate 1973-05-19 1977-06-19 1492
## 2                       watergate 1973-05-19 1977-06-19 1492
## 3                       watergate 1973-05-19 1977-06-19 1492
## 4                       watergate 1973-05-19 1977-06-19 1492
## 5                       watergate 1973-05-19 1977-06-19 1492
## 6                       watergate 1973-05-19 1977-06-19 1492
## 7                       watergate 1973-05-19 1977-06-19 1492
## 8                       watergate 1973-05-19 1977-06-19 1492
## 9                       watergate 1973-05-19 1977-06-19 1492
## 10                      watergate 1973-05-19 1977-06-19 1492
## 11                      watergate 1973-05-19 1977-06-19 1492
## 12                      watergate 1973-05-19 1977-06-19 1492
## 13                      watergate 1973-05-19 1977-06-19 1492
## 14                      watergate 1973-05-19 1977-06-19 1492
## 15                      watergate 1973-05-19 1977-06-19 1492
## 16                      watergate 1973-05-19 1977-06-19 1492
## 17                      watergate 1973-05-19 1977-06-19 1492
## 18                      watergate 1973-05-19 1977-06-19 1492
## 19                      watergate 1973-05-19 1977-06-19 1492
## 20                      watergate 1973-05-19 1977-06-19 1492
## 21                      watergate 1973-05-19 1977-06-19 1492
## 22                      watergate 1973-05-19 1977-06-19 1492
## 23                      watergate 1973-05-19 1977-06-19 1492
## 24                      watergate 1973-05-19 1977-06-19 1492
## 25                      watergate 1973-05-19 1977-06-19 1492
## 26                      watergate 1973-05-19 1977-06-19 1492
## 27                      watergate 1973-05-19 1977-06-19 1492
## 28                      watergate 1973-05-19 1977-06-19 1492
## 29                      watergate 1973-05-19 1977-06-19 1492
## 30                      watergate 1973-05-19 1977-06-19 1492
## 31                      watergate 1973-05-19 1977-06-19 1492
## 32                      watergate 1973-05-19 1977-06-19 1492
## 33                      watergate 1973-05-19 1977-06-19 1492
## 34                      watergate 1973-05-19 1977-06-19 1492
## 35                      watergate 1973-05-19 1977-06-19 1492
## 36                      watergate 1973-05-19 1977-06-19 1492
## 37                      watergate 1973-05-19 1977-06-19 1492
## 38                      watergate 1973-05-19 1977-06-19 1492
## 39                      watergate 1973-05-19 1977-06-19 1492
## 40                      watergate 1973-05-19 1977-06-19 1492
## 41                      watergate 1973-05-19 1977-06-19 1492
## 42                      watergate 1973-05-19 1977-06-19 1492
## 43                      watergate 1973-05-19 1977-06-19 1492
## 44                      watergate 1973-05-19 1977-06-19 1492
## 45                      watergate 1973-05-19 1977-06-19 1492
## 46                      watergate 1973-05-19 1977-06-19 1492
## 47                      watergate 1973-05-19 1977-06-19 1492
## 48                      watergate 1973-05-19 1977-06-19 1492
## 49                      watergate 1973-05-19 1977-06-19 1492
## 50                      watergate 1973-05-19 1977-06-19 1492
## 51                      watergate 1973-05-19 1977-06-19 1492
## 52                      watergate 1973-05-19 1977-06-19 1492
## 53                      watergate 1973-05-19 1977-06-19 1492
## 54                      watergate 1973-05-19 1977-06-19 1492
## 55                      watergate 1973-05-19 1977-06-19 1492
## 56                      watergate 1973-05-19 1977-06-19 1492
## 57                      watergate 1973-05-19 1977-06-19 1492
## 58                      watergate 1973-05-19 1977-06-19 1492
## 59                      watergate 1973-05-19 1977-06-19 1492
## 60                      watergate 1973-05-19 1977-06-19 1492
## 61                      watergate 1973-05-19 1977-06-19 1492
## 62                      watergate 1973-05-19 1977-06-19 1492
## 63                      watergate 1973-05-19 1977-06-19 1492
## 64                      watergate 1973-05-19 1977-06-19 1492
## 65                      watergate 1973-05-19 1977-06-19 1492
## 66                      watergate 1973-05-19 1977-06-19 1492
## 67                      watergate 1973-05-19 1977-06-19 1492
## 68                      watergate 1973-05-19 1977-06-19 1492
## 69                      watergate 1973-05-19 1977-06-19 1493
## 70                      watergate 1973-05-19 1977-06-19 1492
## 71                      watergate 1973-05-19 1977-06-19 1494
## 72                      watergate 1973-05-19 1977-06-19 1492
## 73                hamilton-jordan 1979-11-29 1980-05-28  181
## 74                      tim-kraft 1980-09-09 1982-01-15  493
## 75                raymond-donovan 1981-12-29 1982-06-25  178
## 76                    edwin-meese 1984-04-02 1984-09-20  171
## 77                      ted-olson 1986-04-23 1989-03-14 1056
## 78                         deaver 1986-05-29 1989-08-16 1175
## 79    sealed-investigation-reagan 1986-12-19 1987-12-18  364
## 80                    iran-contra 1986-12-19 1993-08-03 2419
## 81                    iran-contra 1986-12-19 1993-08-03 2419
## 82                    iran-contra 1986-12-19 1993-08-03 2419
## 83                    iran-contra 1986-12-19 1993-08-03 2419
## 84                    iran-contra 1986-12-19 1993-08-03 2419
## 85                    iran-contra 1986-12-19 1993-08-03 2419
## 86                    iran-contra 1986-12-19 1993-08-03 2419
## 87                    iran-contra 1986-12-19 1993-08-03 2419
## 88                    iran-contra 1986-12-19 1993-08-03 2419
## 89                    iran-contra 1986-12-19 1993-08-03 2419
## 90                    iran-contra 1986-12-19 1993-08-03 2419
## 91                    iran-contra 1986-12-19 1993-08-03 2419
## 92                    iran-contra 1986-12-19 1993-08-03 2419
## 93                    iran-contra 1986-12-19 1993-08-03 2419
## 94                        wedtech 1987-02-02 1988-07-08  522
## 95  sealed-investigation-hwbush-1 1991-04-19 1992-07-15  453
## 96                         pierce 1990-03-01 1998-10-27 3162
## 97                         pierce 1990-03-01 1998-10-27 3162
## 98                         pierce 1990-03-01 1998-10-27 3162
## 99                         pierce 1990-03-01 1998-10-27 3162
## 100                        pierce 1990-03-01 1998-10-27 3162
## 101                        pierce 1990-03-01 1998-10-27 3162
## 102                        pierce 1990-03-01 1998-10-27 3162
## 103                        pierce 1990-03-01 1998-10-27 3162
## 104                        pierce 1990-03-01 1998-10-27 3162
## 105                        pierce 1990-03-01 1998-10-27 3162
## 106                        pierce 1990-03-01 1998-10-27 3162
## 107                        pierce 1990-03-01 1998-10-27 3162
## 108                        pierce 1990-03-01 1998-10-27 3162
## 109                        pierce 1990-03-01 1998-10-27 3162
## 110                        pierce 1990-03-01 1998-10-27 3162
## 111                        pierce 1990-03-01 1998-10-27 3162
## 112                        pierce 1990-03-01 1998-10-27 3162
## 113                        pierce 1990-03-01 1998-10-27 3162
## 114 sealed-investigation-hwbush-2 1991-04-19 1992-07-15  453
## 115         bush-clinton-passport 1992-12-14 1995-11-30 1081
## 116                    whitewater 1994-08-05 2002-03-06 2770
## 117                    whitewater 1994-08-05 2002-03-06 2770
## 118                    whitewater 1994-08-05 2002-03-06 2770
## 119                    whitewater 1994-08-05 2002-03-06 2770
## 120                    whitewater 1994-08-05 2002-03-06 2770
## 121                    whitewater 1994-08-05 2002-03-06 2770
## 122                    whitewater 1994-08-05 2002-03-06 2770
## 123                    whitewater 1994-08-05 2002-03-06 2770
## 124                    whitewater 1994-08-05 2002-03-06 2770
## 125                    whitewater 1994-08-05 2002-03-06 2770
## 126                    whitewater 1994-08-05 2002-03-06 2770
## 127                    whitewater 1994-08-05 2002-03-06 2770
## 128                    whitewater 1994-08-05 2002-03-06 2770
## 129                    whitewater 1994-08-05 2002-03-06 2770
## 130                    whitewater 1994-08-05 2002-03-06 2770
## 131                    whitewater 1994-08-05 2002-03-06 2770
## 132                    whitewater 1994-08-05 2002-03-06 2770
## 133                    whitewater 1994-08-05 2002-03-06 2770
## 134                    whitewater 1994-08-05 2002-03-06 2770
## 135                    whitewater 1994-08-05 2002-03-06 2770
## 136                          espy 1994-09-09 2001-01-30 2335
## 137                          espy 1994-09-09 2001-01-30 2335
## 138                          espy 1994-09-09 2001-01-30 2335
## 139                          espy 1994-09-09 2001-01-30 2335
## 140                          espy 1994-09-09 2001-01-30 2335
## 141                          espy 1994-09-09 2001-01-30 2335
## 142                          espy 1994-09-09 2001-01-30 2335
## 143                          espy 1994-09-09 2001-01-30 2335
## 144                          espy 1994-09-09 2001-01-30 2335
## 145                          espy 1994-09-09 2001-01-30 2335
## 146                          espy 1994-09-09 2001-01-30 2335
## 147                          espy 1994-09-09 2001-01-30 2335
## 148                          espy 1994-09-09 2001-01-30 2335
## 149                      cisneros 1995-05-24 2004-08-31 3387
## 150                      cisneros 1995-05-24 2004-08-31 3387
## 151                      cisneros 1995-05-24 2004-08-31 3387
## 152                      cisneros 1995-05-24 2004-08-31 3387
## 153                      cisneros 1995-05-24 2004-08-31 3387
## 154                      cisneros 1995-05-24 2004-08-31 3387
## 155                     ron-brown 1995-07-06 1996-11-14  497
## 156                     eli-segal 1996-11-27 1997-08-21  267
## 157                 bruce-babbitt 1998-03-19 1999-12-30  651
## 158                        herman 1998-05-26 2000-04-07  682
## 159                          waco 1999-09-09 2000-04-22  226
## 160                         plame 2003-12-31 2007-03-06 1161
## 161                        russia 2017-05-17             659
## 162                        russia 2017-05-17             659
## 163                        russia 2017-05-17             659
## 164                        russia 2017-05-17             659
## 165                        russia 2017-05-17             659
## 166                        russia 2017-05-17             659
## 167                        russia 2017-05-17             659
## 168                        russia 2017-05-17             659
## 169                        russia 2017-05-17             659
## 170                        russia 2017-05-17             659
## 171                        russia 2017-05-17             659
## 172                        russia 2017-05-17             659
## 173                        russia 2017-05-17             659
## 174                        russia 2017-05-17             659
## 175                        russia 2017-05-17             659
## 176                        russia 2017-05-17             659
## 177                        russia 2017-05-17             659
## 178                        russia 2017-05-17             659
## 179                        russia 2017-05-17             659
## 180                        russia 2017-05-17             659
## 181                        russia 2017-05-17             659
## 182                        russia 2017-05-17             659
## 183                        russia 2017-05-17             659
## 184                        russia 2017-05-17             659
## 185                        russia 2017-05-17             659
## 186                        russia 2017-05-17             659
## 187                        russia 2017-05-17             659
## 188                        russia 2017-05-17             659
## 189                        russia 2017-05-17             659
## 190                        russia 2017-05-17             659
## 191                        russia 2017-05-17             659
## 192                        russia 2017-05-17             659
## 193                        russia 2017-05-17             659
## 194                        russia 2017-05-17             659
##                       Defendants    Legality Retraction Pardoned
## 1                James W. McCord  conviction      FALSE    FALSE
## 2              Bernard L. Barker  conviction      FALSE    FALSE
## 3              Bernard L. Barker  conviction       TRUE    FALSE
## 4            Eugenio R. Martinez guilty-plea      FALSE     TRUE
## 5            Eugenio R. Martinez  conviction       TRUE    FALSE
## 6               Frank A. Sturgis guilty-plea      FALSE    FALSE
## 7           Virgilio R. Gonzalez guilty-plea      FALSE    FALSE
## 8                G. Gordon Liddy  conviction      FALSE    FALSE
## 9                G. Gordon Liddy  conviction      FALSE    FALSE
## 10                E. Howard Hunt guilty-plea      FALSE    FALSE
## 11             Robert C. Mardian  conviction       TRUE    FALSE
## 12              Maurice H. Stans  indictment      FALSE    FALSE
## 13              Maurice H. Stans guilty-plea      FALSE    FALSE
## 14               Robert L. Vesco  indictment      FALSE    FALSE
## 15                Harry L. Sears  indictment      FALSE    FALSE
## 16                George Hearing guilty-plea      FALSE    FALSE
## 17              John N. Mitchell  conviction      FALSE    FALSE
## 18               Frederick LaRue guilty-plea      FALSE    FALSE
## 19                  Jeb Magruder guilty-plea      FALSE    FALSE
## 20               Donald Segretti guilty-plea      FALSE    FALSE
## 21                    Egil Krogh guilty-plea      FALSE    FALSE
## 22                 Harry Heltzer guilty-plea      FALSE    FALSE
## 23               Russell DeYoung guilty-plea      FALSE    FALSE
## 24              John W. Dean III guilty-plea      FALSE    FALSE
## 25             Dwayne O. Andreas  indictment      FALSE    FALSE
## 26           Harding L. Lawrence guilty-plea      FALSE    FALSE
## 27           Claude C. Wild, Jr. guilty-plea      FALSE    FALSE
## 28                Orin E. Atkins guilty-plea      FALSE    FALSE
## 29                 Dwight Chapin  conviction      FALSE    FALSE
## 30             William W. Keeler guilty-plea      FALSE    FALSE
## 31              H. Everett Olson guilty-plea      FALSE    FALSE
## 32                Herbert Porter guilty-plea      FALSE    FALSE
## 33                 Jake Jacobsen guilty-plea      FALSE    FALSE
## 34              Herbert Kalmbach guilty-plea      FALSE    FALSE
## 35                Charles Colson guilty-plea      FALSE    FALSE
## 36                 H.R. Haldeman  conviction      FALSE    FALSE
## 37            John D. Ehrlichman  conviction      FALSE    FALSE
## 38            Gordon C. Strachan  indictment      FALSE    FALSE
## 39          Kenneth W. Parkinson  indictment      FALSE    FALSE
## 40               Felipe De Diego  indictment      FALSE    FALSE
## 41                  Ray Dubrowin guilty-plea      FALSE    FALSE
## 42                   Ed Reinecke  conviction       TRUE    FALSE
## 43        George M. Steinbrenner guilty-plea      FALSE     TRUE
## 44               John H. Melcher guilty-plea      FALSE    FALSE
## 45           Richard Kleindienst guilty-plea      FALSE    FALSE
## 46                   James Allen guilty-plea      FALSE    FALSE
## 47               Thomas V. Jones guilty-plea      FALSE    FALSE
## 48            Richard L. Allison guilty-plea      FALSE    FALSE
## 49            Francis X. Carroll guilty-plea      FALSE    FALSE
## 50                 David L. Parr guilty-plea      FALSE     TRUE
## 51              John B. Connally  indictment      FALSE    FALSE
## 52                 Harold Nelson guilty-plea      FALSE     TRUE
## 53                Norman Sherman guilty-plea      FALSE    FALSE
## 54                John Valentine guilty-plea      FALSE    FALSE
## 55            William Lyles, Sr. guilty-plea      FALSE    FALSE
## 56             Raymond Abendroth guilty-plea      FALSE    FALSE
## 57                 Edward Morgan guilty-plea      FALSE    FALSE
## 58               Jack A. Gleason guilty-plea      FALSE    FALSE
## 59            Charles N. Huseman guilty-plea      FALSE    FALSE
## 60                Tim M. Babcock guilty-plea      FALSE    FALSE
## 61                    Harry Dent guilty-plea      FALSE    FALSE
## 62                Stuart Russell  indictment       TRUE    FALSE
## 63                 Jack Chestnut  conviction      FALSE    FALSE
## 64                  Harry Ratrie  conviction      FALSE    FALSE
## 65         Augustus Robbins, III  conviction      FALSE    FALSE
## 66                 Wendell Wyatt  conviction      FALSE    FALSE
## 67                 Frank DeMarco  indictment      FALSE    FALSE
## 68                  Ralph Newman  conviction      FALSE    FALSE
## 69                 Armand Hammer guilty-plea      FALSE     TRUE
## 70                James R. Jones guilty-plea      FALSE    FALSE
## 71             William C. Viglia guilty-plea      FALSE    FALSE
## 72              W. Marvin Watson guilty-plea      FALSE    FALSE
## 73                                                FALSE    FALSE
## 74                                                FALSE    FALSE
## 75                                                FALSE    FALSE
## 76                                                FALSE    FALSE
## 77                                                FALSE    FALSE
## 78                Michael Deaver  conviction      FALSE    FALSE
## 79                                                FALSE    FALSE
## 80              Carl R. Channell guilty-plea      FALSE    FALSE
## 81                Richard Miller guilty-plea      FALSE    FALSE
## 82              Robert McFarlane guilty-plea      FALSE     TRUE
## 83                  Oliver North  conviction       TRUE    FALSE
## 84               John Poindexter  conviction       TRUE    FALSE
## 85                Richard Secord guilty-plea      FALSE    FALSE
## 86                  Albert Hakim guilty-plea      FALSE    FALSE
## 87              Joseph Fernandez  indictment      FALSE    FALSE
## 88              Thomas G. Clines  conviction      FALSE    FALSE
## 89                 Alan G. Fiers guilty-plea      FALSE     TRUE
## 90               Clair E. George  conviction      FALSE     TRUE
## 91                Elliott Abrams guilty-plea      FALSE     TRUE
## 92               Duane Clarridge  indictment      FALSE     TRUE
## 93             Caspar Weinberger  indictment      FALSE     TRUE
## 94                  Lyn Nofziger  conviction       TRUE    FALSE
## 95                                                FALSE    FALSE
## 96               Leonard Briscoe  conviction      FALSE    FALSE
## 97                Maurice Steier  conviction      FALSE    FALSE
## 98          Samuel P. Singletary guilty-plea      FALSE    FALSE
## 99               Lance H. Wilson  conviction       TRUE    FALSE
## 100              Victor R. Cruse  indictment      FALSE    FALSE
## 101            Deborah Gore Dean  conviction      FALSE    FALSE
## 102                Thomas Demery guilty-plea      FALSE    FALSE
## 103           Phillip McCafferty  indictment      FALSE    FALSE
## 104            Elaine Richardson guilty-plea      FALSE    FALSE
## 105      Silvio J. DeBartolomeis guilty-plea      FALSE    FALSE
## 106               Philip D. Winn guilty-plea      FALSE     TRUE
## 107              Robert B. Olsen guilty-plea      FALSE    FALSE
## 108             Joseph A. Straus guilty-plea      FALSE    FALSE
## 109           J. Michael Queenan  conviction      FALSE    FALSE
## 110              Ronald L. Mahon  conviction      FALSE    FALSE
## 111           Carlos A. Figueroa guilty-plea      FALSE    FALSE
## 112 Catalina Vasquez Villalpando guilty-plea      FALSE    FALSE
## 113                James G. Watt guilty-plea      FALSE    FALSE
## 114                                               FALSE    FALSE
## 115                                               FALSE    FALSE
## 116                David L. Hale guilty-plea      FALSE    FALSE
## 117             Charles Matthews guilty-plea      FALSE    FALSE
## 118              Eugene Fitzhugh guilty-plea      FALSE    FALSE
## 119             Robert W. Palmer guilty-plea      FALSE    FALSE
## 120           Webster L. Hubbell guilty-plea      FALSE     TRUE
## 121               Neal T. Ainley guilty-plea      FALSE    FALSE
## 122             Christopher Wade guilty-plea      FALSE     TRUE
## 123               Jim Guy Tucker  conviction      FALSE    FALSE
## 124                   John Haley guilty-plea      FALSE    FALSE
## 125             Stephen A. Smith guilty-plea      FALSE     TRUE
## 126         William J. Marks Sr. guilty-plea      FALSE    FALSE
## 127                   Larry Kuca guilty-plea      FALSE    FALSE
## 128               James McDougal  conviction      FALSE    FALSE
## 129               Susan McDougal  conviction      FALSE     TRUE
## 130             Herbert Branscum  indictment      FALSE    FALSE
## 131                  Robert Hill  indictment      FALSE    FALSE
## 132              Suzanna Hubbell  indictment      FALSE    FALSE
## 133         Michael C. Schaufele  indictment      FALSE    FALSE
## 134              Charles C. Owen  indictment      FALSE    FALSE
## 135           Julie Hiatt Steele  indictment      FALSE    FALSE
## 136                   James Lake guilty-plea      FALSE     TRUE
## 137    Brooke Keith Mitchell, Sr guilty-plea      FALSE     TRUE
## 138    Brooke Keith Mitchell, Jr  indictment      FALSE    FALSE
## 139                   Gary Black  indictment      FALSE    FALSE
## 140          Alverez Ferrouillet  conviction      FALSE     TRUE
## 141              Henry Espy, Jr.  indictment      FALSE    FALSE
## 142              John Hemmingson  conviction      FALSE     TRUE
## 143             Jack L. Williams  conviction      FALSE     TRUE
## 144              Richard Douglas guilty-plea      FALSE     TRUE
## 145            Norris Faust, Jr.  indictment      FALSE    FALSE
## 146           Ronald H. Blackley  conviction      FALSE    FALSE
## 147                    Mike Espy  indictment      FALSE    FALSE
## 148           Archibald Schaffer  conviction      FALSE     TRUE
## 149         Linda (Medlar) Jones guilty-plea      FALSE     TRUE
## 150                 Patsy Wooten guilty-plea      FALSE    FALSE
## 151                 Allen Wooten guilty-plea      FALSE    FALSE
## 152               Henry Cisneros guilty-plea      FALSE     TRUE
## 153           Sylvia Arce-Garcia  indictment      FALSE    FALSE
## 154              John D. Rosales  indictment      FALSE    FALSE
## 155                                               FALSE    FALSE
## 156                                               FALSE    FALSE
## 157                                               FALSE    FALSE
## 158                 Abdul Rahman  indictment      FALSE    FALSE
## 159                                               FALSE    FALSE
## 160     I. Lewis "Scooter" Libby  conviction      FALSE     TRUE
## 161          George Papadopolous guilty-plea      FALSE    FALSE
## 162                Paul Manafort  conviction      FALSE    FALSE
## 163                   Rick Gates guilty-plea      FALSE    FALSE
## 164                Michael Flynn guilty-plea      FALSE    FALSE
## 165           Russian national 1  indictment      FALSE    FALSE
## 166           Russian national 2  indictment      FALSE    FALSE
## 167           Russian national 3  indictment      FALSE    FALSE
## 168           Russian national 4  indictment      FALSE    FALSE
## 169           Russian national 5  indictment      FALSE    FALSE
## 170           Russian national 6  indictment      FALSE    FALSE
## 171           Russian national 7  indictment      FALSE    FALSE
## 172           Russian national 8  indictment      FALSE    FALSE
## 173           Russian national 9  indictment      FALSE    FALSE
## 174          Russian national 10  indictment      FALSE    FALSE
## 175          Russian national 11  indictment      FALSE    FALSE
## 176          Russian national 12  indictment      FALSE    FALSE
## 177          Russian national 13  indictment      FALSE    FALSE
## 178               Richard Pinedo guilty-plea      FALSE    FALSE
## 179           Alex Van Der Zwaan guilty-plea      FALSE    FALSE
## 180          Konstantin Kilimnik  indictment      FALSE    FALSE
## 181          Russian national 14  indictment      FALSE    FALSE
## 182          Russian national 15  indictment      FALSE    FALSE
## 183          Russian national 16  indictment      FALSE    FALSE
## 184          Russian national 17  indictment      FALSE    FALSE
## 185          Russian national 18  indictment      FALSE    FALSE
## 186          Russian national 19  indictment      FALSE    FALSE
## 187          Russian national 20  indictment      FALSE    FALSE
## 188          Russian national 21  indictment      FALSE    FALSE
## 189          Russian national 22  indictment      FALSE    FALSE
## 190          Russian national 23  indictment      FALSE    FALSE
## 191          Russian national 24  indictment      FALSE    FALSE
## 192          Russian national 25  indictment      FALSE    FALSE
## 193                Michael Cohen guilty-plea      FALSE    FALSE
## 194                  Roger Stone  indictment      FALSE    FALSE
##           Presidency
## 1      Richard Nixon
## 2      Richard Nixon
## 3      Richard Nixon
## 4      Richard Nixon
## 5      Richard Nixon
## 6      Richard Nixon
## 7      Richard Nixon
## 8      Richard Nixon
## 9      Richard Nixon
## 10     Richard Nixon
## 11     Richard Nixon
## 12     Richard Nixon
## 13     Richard Nixon
## 14     Richard Nixon
## 15     Richard Nixon
## 16     Richard Nixon
## 17     Richard Nixon
## 18     Richard Nixon
## 19     Richard Nixon
## 20     Richard Nixon
## 21     Richard Nixon
## 22     Richard Nixon
## 23     Richard Nixon
## 24     Richard Nixon
## 25     Richard Nixon
## 26     Richard Nixon
## 27     Richard Nixon
## 28     Richard Nixon
## 29     Richard Nixon
## 30     Richard Nixon
## 31     Richard Nixon
## 32     Richard Nixon
## 33     Richard Nixon
## 34     Richard Nixon
## 35     Richard Nixon
## 36     Richard Nixon
## 37     Richard Nixon
## 38     Richard Nixon
## 39     Richard Nixon
## 40     Richard Nixon
## 41     Richard Nixon
## 42     Richard Nixon
## 43     Richard Nixon
## 44     Richard Nixon
## 45     Richard Nixon
## 46     Richard Nixon
## 47     Richard Nixon
## 48     Richard Nixon
## 49     Richard Nixon
## 50     Richard Nixon
## 51     Richard Nixon
## 52     Richard Nixon
## 53     Richard Nixon
## 54     Richard Nixon
## 55     Richard Nixon
## 56     Richard Nixon
## 57     Richard Nixon
## 58     Richard Nixon
## 59     Richard Nixon
## 60     Richard Nixon
## 61     Richard Nixon
## 62     Richard Nixon
## 63     Richard Nixon
## 64     Richard Nixon
## 65     Richard Nixon
## 66     Richard Nixon
## 67     Richard Nixon
## 68     Richard Nixon
## 69     Richard Nixon
## 70     Richard Nixon
## 71     Richard Nixon
## 72     Richard Nixon
## 73      Jimmy Carter
## 74      Jimmy Carter
## 75     Ronald Reagan
## 76     Ronald Reagan
## 77     Ronald Reagan
## 78     Ronald Reagan
## 79     Ronald Reagan
## 80     Ronald Reagan
## 81     Ronald Reagan
## 82     Ronald Reagan
## 83     Ronald Reagan
## 84     Ronald Reagan
## 85     Ronald Reagan
## 86     Ronald Reagan
## 87     Ronald Reagan
## 88     Ronald Reagan
## 89     Ronald Reagan
## 90     Ronald Reagan
## 91     Ronald Reagan
## 92     Ronald Reagan
## 93     Ronald Reagan
## 94     Ronald Reagan
## 95  George H.W. Bush
## 96  George H.W. Bush
## 97  George H.W. Bush
## 98  George H.W. Bush
## 99  George H.W. Bush
## 100 George H.W. Bush
## 101 George H.W. Bush
## 102 George H.W. Bush
## 103 George H.W. Bush
## 104 George H.W. Bush
## 105 George H.W. Bush
## 106 George H.W. Bush
## 107 George H.W. Bush
## 108 George H.W. Bush
## 109 George H.W. Bush
## 110 George H.W. Bush
## 111 George H.W. Bush
## 112 George H.W. Bush
## 113 George H.W. Bush
## 114 George H.W. Bush
## 115     Bill Clinton
## 116     Bill Clinton
## 117     Bill Clinton
## 118     Bill Clinton
## 119     Bill Clinton
## 120     Bill Clinton
## 121     Bill Clinton
## 122     Bill Clinton
## 123     Bill Clinton
## 124     Bill Clinton
## 125     Bill Clinton
## 126     Bill Clinton
## 127     Bill Clinton
## 128     Bill Clinton
## 129     Bill Clinton
## 130     Bill Clinton
## 131     Bill Clinton
## 132     Bill Clinton
## 133     Bill Clinton
## 134     Bill Clinton
## 135     Bill Clinton
## 136     Bill Clinton
## 137     Bill Clinton
## 138     Bill Clinton
## 139     Bill Clinton
## 140     Bill Clinton
## 141     Bill Clinton
## 142     Bill Clinton
## 143     Bill Clinton
## 144     Bill Clinton
## 145     Bill Clinton
## 146     Bill Clinton
## 147     Bill Clinton
## 148     Bill Clinton
## 149     Bill Clinton
## 150     Bill Clinton
## 151     Bill Clinton
## 152     Bill Clinton
## 153     Bill Clinton
## 154     Bill Clinton
## 155     Bill Clinton
## 156     Bill Clinton
## 157     Bill Clinton
## 158     Bill Clinton
## 159     Bill Clinton
## 160   George W. Bush
## 161     Donald Trump
## 162     Donald Trump
## 163     Donald Trump
## 164     Donald Trump
## 165     Donald Trump
## 166     Donald Trump
## 167     Donald Trump
## 168     Donald Trump
## 169     Donald Trump
## 170     Donald Trump
## 171     Donald Trump
## 172     Donald Trump
## 173     Donald Trump
## 174     Donald Trump
## 175     Donald Trump
## 176     Donald Trump
## 177     Donald Trump
## 178     Donald Trump
## 179     Donald Trump
## 180     Donald Trump
## 181     Donald Trump
## 182     Donald Trump
## 183     Donald Trump
## 184     Donald Trump
## 185     Donald Trump
## 186     Donald Trump
## 187     Donald Trump
## 188     Donald Trump
## 189     Donald Trump
## 190     Donald Trump
## 191     Donald Trump
## 192     Donald Trump
## 193     Donald Trump
## 194     Donald Trump

PT 3: Creating Watergate and Russiagate subsets

Watergate <- data2[c(1:72), c(1:9)]
Watergate
##      Scandal Start Date   End Date Days             Defendants    Legality
## 1  watergate 1973-05-19 1977-06-19 1492        James W. McCord  conviction
## 2  watergate 1973-05-19 1977-06-19 1492      Bernard L. Barker  conviction
## 3  watergate 1973-05-19 1977-06-19 1492      Bernard L. Barker  conviction
## 4  watergate 1973-05-19 1977-06-19 1492    Eugenio R. Martinez guilty-plea
## 5  watergate 1973-05-19 1977-06-19 1492    Eugenio R. Martinez  conviction
## 6  watergate 1973-05-19 1977-06-19 1492       Frank A. Sturgis guilty-plea
## 7  watergate 1973-05-19 1977-06-19 1492   Virgilio R. Gonzalez guilty-plea
## 8  watergate 1973-05-19 1977-06-19 1492        G. Gordon Liddy  conviction
## 9  watergate 1973-05-19 1977-06-19 1492        G. Gordon Liddy  conviction
## 10 watergate 1973-05-19 1977-06-19 1492         E. Howard Hunt guilty-plea
## 11 watergate 1973-05-19 1977-06-19 1492      Robert C. Mardian  conviction
## 12 watergate 1973-05-19 1977-06-19 1492       Maurice H. Stans  indictment
## 13 watergate 1973-05-19 1977-06-19 1492       Maurice H. Stans guilty-plea
## 14 watergate 1973-05-19 1977-06-19 1492        Robert L. Vesco  indictment
## 15 watergate 1973-05-19 1977-06-19 1492         Harry L. Sears  indictment
## 16 watergate 1973-05-19 1977-06-19 1492         George Hearing guilty-plea
## 17 watergate 1973-05-19 1977-06-19 1492       John N. Mitchell  conviction
## 18 watergate 1973-05-19 1977-06-19 1492        Frederick LaRue guilty-plea
## 19 watergate 1973-05-19 1977-06-19 1492           Jeb Magruder guilty-plea
## 20 watergate 1973-05-19 1977-06-19 1492        Donald Segretti guilty-plea
## 21 watergate 1973-05-19 1977-06-19 1492             Egil Krogh guilty-plea
## 22 watergate 1973-05-19 1977-06-19 1492          Harry Heltzer guilty-plea
## 23 watergate 1973-05-19 1977-06-19 1492        Russell DeYoung guilty-plea
## 24 watergate 1973-05-19 1977-06-19 1492       John W. Dean III guilty-plea
## 25 watergate 1973-05-19 1977-06-19 1492      Dwayne O. Andreas  indictment
## 26 watergate 1973-05-19 1977-06-19 1492    Harding L. Lawrence guilty-plea
## 27 watergate 1973-05-19 1977-06-19 1492    Claude C. Wild, Jr. guilty-plea
## 28 watergate 1973-05-19 1977-06-19 1492         Orin E. Atkins guilty-plea
## 29 watergate 1973-05-19 1977-06-19 1492          Dwight Chapin  conviction
## 30 watergate 1973-05-19 1977-06-19 1492      William W. Keeler guilty-plea
## 31 watergate 1973-05-19 1977-06-19 1492       H. Everett Olson guilty-plea
## 32 watergate 1973-05-19 1977-06-19 1492         Herbert Porter guilty-plea
## 33 watergate 1973-05-19 1977-06-19 1492          Jake Jacobsen guilty-plea
## 34 watergate 1973-05-19 1977-06-19 1492       Herbert Kalmbach guilty-plea
## 35 watergate 1973-05-19 1977-06-19 1492         Charles Colson guilty-plea
## 36 watergate 1973-05-19 1977-06-19 1492          H.R. Haldeman  conviction
## 37 watergate 1973-05-19 1977-06-19 1492     John D. Ehrlichman  conviction
## 38 watergate 1973-05-19 1977-06-19 1492     Gordon C. Strachan  indictment
## 39 watergate 1973-05-19 1977-06-19 1492   Kenneth W. Parkinson  indictment
## 40 watergate 1973-05-19 1977-06-19 1492        Felipe De Diego  indictment
## 41 watergate 1973-05-19 1977-06-19 1492           Ray Dubrowin guilty-plea
## 42 watergate 1973-05-19 1977-06-19 1492            Ed Reinecke  conviction
## 43 watergate 1973-05-19 1977-06-19 1492 George M. Steinbrenner guilty-plea
## 44 watergate 1973-05-19 1977-06-19 1492        John H. Melcher guilty-plea
## 45 watergate 1973-05-19 1977-06-19 1492    Richard Kleindienst guilty-plea
## 46 watergate 1973-05-19 1977-06-19 1492            James Allen guilty-plea
## 47 watergate 1973-05-19 1977-06-19 1492        Thomas V. Jones guilty-plea
## 48 watergate 1973-05-19 1977-06-19 1492     Richard L. Allison guilty-plea
## 49 watergate 1973-05-19 1977-06-19 1492     Francis X. Carroll guilty-plea
## 50 watergate 1973-05-19 1977-06-19 1492          David L. Parr guilty-plea
## 51 watergate 1973-05-19 1977-06-19 1492       John B. Connally  indictment
## 52 watergate 1973-05-19 1977-06-19 1492          Harold Nelson guilty-plea
## 53 watergate 1973-05-19 1977-06-19 1492         Norman Sherman guilty-plea
## 54 watergate 1973-05-19 1977-06-19 1492         John Valentine guilty-plea
## 55 watergate 1973-05-19 1977-06-19 1492     William Lyles, Sr. guilty-plea
## 56 watergate 1973-05-19 1977-06-19 1492      Raymond Abendroth guilty-plea
## 57 watergate 1973-05-19 1977-06-19 1492          Edward Morgan guilty-plea
## 58 watergate 1973-05-19 1977-06-19 1492        Jack A. Gleason guilty-plea
## 59 watergate 1973-05-19 1977-06-19 1492     Charles N. Huseman guilty-plea
## 60 watergate 1973-05-19 1977-06-19 1492         Tim M. Babcock guilty-plea
## 61 watergate 1973-05-19 1977-06-19 1492             Harry Dent guilty-plea
## 62 watergate 1973-05-19 1977-06-19 1492         Stuart Russell  indictment
## 63 watergate 1973-05-19 1977-06-19 1492          Jack Chestnut  conviction
## 64 watergate 1973-05-19 1977-06-19 1492           Harry Ratrie  conviction
## 65 watergate 1973-05-19 1977-06-19 1492  Augustus Robbins, III  conviction
## 66 watergate 1973-05-19 1977-06-19 1492          Wendell Wyatt  conviction
## 67 watergate 1973-05-19 1977-06-19 1492          Frank DeMarco  indictment
## 68 watergate 1973-05-19 1977-06-19 1492           Ralph Newman  conviction
## 69 watergate 1973-05-19 1977-06-19 1493          Armand Hammer guilty-plea
## 70 watergate 1973-05-19 1977-06-19 1492         James R. Jones guilty-plea
## 71 watergate 1973-05-19 1977-06-19 1494      William C. Viglia guilty-plea
## 72 watergate 1973-05-19 1977-06-19 1492       W. Marvin Watson guilty-plea
##    Retraction Pardoned    Presidency
## 1       FALSE    FALSE Richard Nixon
## 2       FALSE    FALSE Richard Nixon
## 3        TRUE    FALSE Richard Nixon
## 4       FALSE     TRUE Richard Nixon
## 5        TRUE    FALSE Richard Nixon
## 6       FALSE    FALSE Richard Nixon
## 7       FALSE    FALSE Richard Nixon
## 8       FALSE    FALSE Richard Nixon
## 9       FALSE    FALSE Richard Nixon
## 10      FALSE    FALSE Richard Nixon
## 11       TRUE    FALSE Richard Nixon
## 12      FALSE    FALSE Richard Nixon
## 13      FALSE    FALSE Richard Nixon
## 14      FALSE    FALSE Richard Nixon
## 15      FALSE    FALSE Richard Nixon
## 16      FALSE    FALSE Richard Nixon
## 17      FALSE    FALSE Richard Nixon
## 18      FALSE    FALSE Richard Nixon
## 19      FALSE    FALSE Richard Nixon
## 20      FALSE    FALSE Richard Nixon
## 21      FALSE    FALSE Richard Nixon
## 22      FALSE    FALSE Richard Nixon
## 23      FALSE    FALSE Richard Nixon
## 24      FALSE    FALSE Richard Nixon
## 25      FALSE    FALSE Richard Nixon
## 26      FALSE    FALSE Richard Nixon
## 27      FALSE    FALSE Richard Nixon
## 28      FALSE    FALSE Richard Nixon
## 29      FALSE    FALSE Richard Nixon
## 30      FALSE    FALSE Richard Nixon
## 31      FALSE    FALSE Richard Nixon
## 32      FALSE    FALSE Richard Nixon
## 33      FALSE    FALSE Richard Nixon
## 34      FALSE    FALSE Richard Nixon
## 35      FALSE    FALSE Richard Nixon
## 36      FALSE    FALSE Richard Nixon
## 37      FALSE    FALSE Richard Nixon
## 38      FALSE    FALSE Richard Nixon
## 39      FALSE    FALSE Richard Nixon
## 40      FALSE    FALSE Richard Nixon
## 41      FALSE    FALSE Richard Nixon
## 42       TRUE    FALSE Richard Nixon
## 43      FALSE     TRUE Richard Nixon
## 44      FALSE    FALSE Richard Nixon
## 45      FALSE    FALSE Richard Nixon
## 46      FALSE    FALSE Richard Nixon
## 47      FALSE    FALSE Richard Nixon
## 48      FALSE    FALSE Richard Nixon
## 49      FALSE    FALSE Richard Nixon
## 50      FALSE     TRUE Richard Nixon
## 51      FALSE    FALSE Richard Nixon
## 52      FALSE     TRUE Richard Nixon
## 53      FALSE    FALSE Richard Nixon
## 54      FALSE    FALSE Richard Nixon
## 55      FALSE    FALSE Richard Nixon
## 56      FALSE    FALSE Richard Nixon
## 57      FALSE    FALSE Richard Nixon
## 58      FALSE    FALSE Richard Nixon
## 59      FALSE    FALSE Richard Nixon
## 60      FALSE    FALSE Richard Nixon
## 61      FALSE    FALSE Richard Nixon
## 62       TRUE    FALSE Richard Nixon
## 63      FALSE    FALSE Richard Nixon
## 64      FALSE    FALSE Richard Nixon
## 65      FALSE    FALSE Richard Nixon
## 66      FALSE    FALSE Richard Nixon
## 67      FALSE    FALSE Richard Nixon
## 68      FALSE    FALSE Richard Nixon
## 69      FALSE     TRUE Richard Nixon
## 70      FALSE    FALSE Richard Nixon
## 71      FALSE    FALSE Richard Nixon
## 72      FALSE    FALSE Richard Nixon
Russiagate <-data2[-c(1:160), c(1:9)]
Russiagate
##     Scandal Start Date End Date Days          Defendants    Legality Retraction
## 161  russia 2017-05-17           659 George Papadopolous guilty-plea      FALSE
## 162  russia 2017-05-17           659       Paul Manafort  conviction      FALSE
## 163  russia 2017-05-17           659          Rick Gates guilty-plea      FALSE
## 164  russia 2017-05-17           659       Michael Flynn guilty-plea      FALSE
## 165  russia 2017-05-17           659  Russian national 1  indictment      FALSE
## 166  russia 2017-05-17           659  Russian national 2  indictment      FALSE
## 167  russia 2017-05-17           659  Russian national 3  indictment      FALSE
## 168  russia 2017-05-17           659  Russian national 4  indictment      FALSE
## 169  russia 2017-05-17           659  Russian national 5  indictment      FALSE
## 170  russia 2017-05-17           659  Russian national 6  indictment      FALSE
## 171  russia 2017-05-17           659  Russian national 7  indictment      FALSE
## 172  russia 2017-05-17           659  Russian national 8  indictment      FALSE
## 173  russia 2017-05-17           659  Russian national 9  indictment      FALSE
## 174  russia 2017-05-17           659 Russian national 10  indictment      FALSE
## 175  russia 2017-05-17           659 Russian national 11  indictment      FALSE
## 176  russia 2017-05-17           659 Russian national 12  indictment      FALSE
## 177  russia 2017-05-17           659 Russian national 13  indictment      FALSE
## 178  russia 2017-05-17           659      Richard Pinedo guilty-plea      FALSE
## 179  russia 2017-05-17           659  Alex Van Der Zwaan guilty-plea      FALSE
## 180  russia 2017-05-17           659 Konstantin Kilimnik  indictment      FALSE
## 181  russia 2017-05-17           659 Russian national 14  indictment      FALSE
## 182  russia 2017-05-17           659 Russian national 15  indictment      FALSE
## 183  russia 2017-05-17           659 Russian national 16  indictment      FALSE
## 184  russia 2017-05-17           659 Russian national 17  indictment      FALSE
## 185  russia 2017-05-17           659 Russian national 18  indictment      FALSE
## 186  russia 2017-05-17           659 Russian national 19  indictment      FALSE
## 187  russia 2017-05-17           659 Russian national 20  indictment      FALSE
## 188  russia 2017-05-17           659 Russian national 21  indictment      FALSE
## 189  russia 2017-05-17           659 Russian national 22  indictment      FALSE
## 190  russia 2017-05-17           659 Russian national 23  indictment      FALSE
## 191  russia 2017-05-17           659 Russian national 24  indictment      FALSE
## 192  russia 2017-05-17           659 Russian national 25  indictment      FALSE
## 193  russia 2017-05-17           659       Michael Cohen guilty-plea      FALSE
## 194  russia 2017-05-17           659         Roger Stone  indictment      FALSE
##     Pardoned   Presidency
## 161    FALSE Donald Trump
## 162    FALSE Donald Trump
## 163    FALSE Donald Trump
## 164    FALSE Donald Trump
## 165    FALSE Donald Trump
## 166    FALSE Donald Trump
## 167    FALSE Donald Trump
## 168    FALSE Donald Trump
## 169    FALSE Donald Trump
## 170    FALSE Donald Trump
## 171    FALSE Donald Trump
## 172    FALSE Donald Trump
## 173    FALSE Donald Trump
## 174    FALSE Donald Trump
## 175    FALSE Donald Trump
## 176    FALSE Donald Trump
## 177    FALSE Donald Trump
## 178    FALSE Donald Trump
## 179    FALSE Donald Trump
## 180    FALSE Donald Trump
## 181    FALSE Donald Trump
## 182    FALSE Donald Trump
## 183    FALSE Donald Trump
## 184    FALSE Donald Trump
## 185    FALSE Donald Trump
## 186    FALSE Donald Trump
## 187    FALSE Donald Trump
## 188    FALSE Donald Trump
## 189    FALSE Donald Trump
## 190    FALSE Donald Trump
## 191    FALSE Donald Trump
## 192    FALSE Donald Trump
## 193    FALSE Donald Trump
## 194    FALSE Donald Trump

PT 4: Tallying legal outcomes in Watergate and Russiagate respectively: Suspects are only convicted, plead guilty, or indicted–if one is convicted or plead guilty, then a sentence is served. If one is only indicted, then they are only under investigation for their involvement in the case. DOES NOT MEAN THEY ARE GUILTY.

Outcome_Watergate <- table(unlist(strsplit(tolower(Watergate$Legality), " ")))
Outcome_Watergate
## 
##  conviction guilty-plea  indictment 
##          17          45          10
Outcome_Russiagate <- table(unlist(strsplit(tolower(Russiagate$Legality), " ")))
Outcome_Russiagate
## 
##  conviction guilty-plea  indictment 
##           1           6          27

Conclusions:

In short, Watergate and Russiagate are certainly not alike. For one thing, Watergate has a substantial number of those who plead guilty, and were convicted (52 defendants). On the other hand, Russiagate only has 7 individuals who were convicted and plead guilty (only 1 plead guilty)

It is important to consider that before President Trump left office, he pardoned the following defendants for their indictments in Russiagate: George Papadopolous, Paul Manafort, Michael Flynn, Alex Van Der Zwaan, and Michael Cohen. President Trump has also commuted the sentence of Roger Stone via the grant of clemency. Since these are 6 individuals, that means only one individual remains from being indicted. According to the DOJ, the Dutch Lawyer Alex Can Der Zwaan was the individual who plead guilty.

Another important consideration is the fact that many of the indicted individuals are anonymous in this data set, as they are refferred to as “Russian Nationals”. I was not able to find who the Russians were in this case, and therefore could not determine if they were pardoned by President Trump.

Ultimately, this data set, particularly the Russiagate subset, is flawed due to the lack of updated information by the author. It has not been updated since March 2019, and much has changed in the outcome of this trial since then.

Recommendations: If possible, it would be advisable to change the data entries under the columns of legality in order to update the legal status of the defendants.

LS0tDQp0aXRsZTogIkRhdGEgNjA3OiBMYWIgMSINCmF1dGhvcjogIkpvZSBDb25ub2xseSINCmRhdGU6ICJgciBTeXMuRGF0ZSgpYCINCm91dHB1dDogb3BlbmludHJvOjpsYWJfcmVwb3J0DQotLS0NCmh0dHBzOi8vcHJvamVjdHMuZml2ZXRoaXJ0eWVpZ2h0LmNvbS9ydXNzaWEtaW52ZXN0aWdhdGlvbi8NClRoZSBkYXRhc2V0IEkgaGF2ZSBjaG9zZW4gZm9yIHRoaXMgYXNzaWdubWVudHMgaXMgYSBjb2xsZWN0aW9uIG9mIHNjYW5kYWxzIHRoYXQgDQp0b29rIHBsYWNlIGR1cmluZyBVUyBwcmVzaWRlbmNpZXMuIEZvciB0aGlzIGFzc2lnbm1lbnQsIEkgY2hvc2UgdG8gY29tcGFyZQ0KV2F0ZXJnYXRlIHRvIFJ1c3NpYWdhdGUsIGFzIEkgZm91bmQgaW5zcGlyYXRpb24gZnJvbSB0aGUgdGl0bGUgb2YgdGhlIA0KRml2ZVRoaXJ0eUVpZ2h0IGFydGljbGU6IklzIHRoZSBSdXNzaWEgSW52ZXN0aWdhdGlvbiBSZWFsbHkgQW5vdGhlciBXYXRlcmdhdGU/Ig0KDQpJbW1lZGlhdGVseSwgd2UgY2FuIHNheSBubywgYXMgYm90aCBzY2FuZGFscyBhcmUgY2xlYXJseSBpbmRlcGVuZGVudCAgDQpvZiBlYWNoIG90aGVyLiBCdXQgd2hhdCBJIGZvdW5kIGludGVyZXN0aW5nIHdlcmUgdGhlIGRpZmZlcmVuY2VzIGJldHdlZW4gdGhvc2UgDQp3aG8gd2VyZSBzZW50ZW5jZWQgaW4gV2F0ZXJnYXRlIGFuZCBSdXNzaWFnYXRlOiBBY2NvcmRpbmcgdGhlIGdyYXBocyBvbiA1MzgsDQp3ZSBjYW4gY2xlYXJseSBzZWUgbW9yZSBpbmRpdmlkdWFscyB3ZXJlIGluZGljdGVkLCBidXQgbm90IGNvbnZpY3RlZCwgZHVyaW5nIA0KUnVzc2lhZ2F0ZSB0aGFuIFdhdGVyZ2F0ZS4gVGhpcyBpcyBleGVtcGxpZmllZCB1bmRlciB0aGUgIlBsZWFzIiBzZWN0aW9uLg0KDQoNCg0KUFQgMTogTG9hZGluZyBEYXRhDQpgYGB7cn0NCg0KbGlicmFyeSh0aWR5dmVyc2UpDQpsaWJyYXJ5KG9wZW5pbnRybykNCmxpYnJhcnkoZHBseXIpDQoNCnggPC0gcmVhZC5jc3YoImh0dHBzOi8vcmF3LmdpdGh1YnVzZXJjb250ZW50LmNvbS9maXZldGhpcnR5ZWlnaHQvZGF0YS9tYXN0ZXIvcnVzc2lhLWludmVzdGlnYXRpb24vcnVzc2lhLWludmVzdGlnYXRpb24uY3N2IikNCnN0cih4KQ0KYGBgDQoNCg0KUFQgMjogRHJvcHBpbmcsIGFuZCByZW5hbWluZyBjb2x1bW5zDQpgYGAge3J9DQoNCmRhdGExIDwtIHNlbGVjdCh4LCAtYyhpbmRpY3RtZW50LmRheXMsIGNwLmRhdGUsIGNwLmRheXMsIGFtZXJpY2FuKSkNCm5hbWVzKGRhdGExKSA8LSBjKCJTY2FuZGFsIiwgIlN0YXJ0IERhdGUiLCAiRW5kIERhdGUiLCAiRGF5cyIsICJEZWZlbmRhbnRzIiwgIkxlZ2FsaXR5IiwgIlJldHJhY3Rpb24iLCAiUGFyZG9uZWQiLCAiUHJlc2lkZW5jeSIpDQoNCmRhdGEyIDwtIG5hbWVzKGRhdGExKSA8LSBkYXRhMQ0KZGF0YTINCg0KYGBgDQoNCg0KUFQgMzogQ3JlYXRpbmcgV2F0ZXJnYXRlIGFuZCBSdXNzaWFnYXRlIHN1YnNldHMNCmBgYHtyfQ0KDQpXYXRlcmdhdGUgPC0gZGF0YTJbYygxOjcyKSwgYygxOjkpXQ0KV2F0ZXJnYXRlDQoNClJ1c3NpYWdhdGUgPC1kYXRhMlstYygxOjE2MCksIGMoMTo5KV0NClJ1c3NpYWdhdGUNCg0KDQpgYGANCg0KUFQgNDogVGFsbHlpbmcgbGVnYWwgb3V0Y29tZXMgaW4gV2F0ZXJnYXRlIGFuZCBSdXNzaWFnYXRlIHJlc3BlY3RpdmVseToNClN1c3BlY3RzIGFyZSBvbmx5IGNvbnZpY3RlZCwgcGxlYWQgZ3VpbHR5LCBvciBpbmRpY3RlZC0taWYgb25lIGlzIGNvbnZpY3RlZCBvciBwbGVhZCBndWlsdHksIHRoZW4gYSBzZW50ZW5jZSBpcyBzZXJ2ZWQuIElmIG9uZSBpcyBvbmx5IGluZGljdGVkLCB0aGVuIHRoZXkgYXJlIG9ubHkgdW5kZXIgaW52ZXN0aWdhdGlvbiBmb3IgdGhlaXIgaW52b2x2ZW1lbnQgaW4gdGhlIGNhc2UuIERPRVMgTk9UIE1FQU4gVEhFWSBBUkUgR1VJTFRZLg0KYGBge3J9DQoNCk91dGNvbWVfV2F0ZXJnYXRlIDwtIHRhYmxlKHVubGlzdChzdHJzcGxpdCh0b2xvd2VyKFdhdGVyZ2F0ZSRMZWdhbGl0eSksICIgIikpKQ0KT3V0Y29tZV9XYXRlcmdhdGUNCg0KT3V0Y29tZV9SdXNzaWFnYXRlIDwtIHRhYmxlKHVubGlzdChzdHJzcGxpdCh0b2xvd2VyKFJ1c3NpYWdhdGUkTGVnYWxpdHkpLCAiICIpKSkNCk91dGNvbWVfUnVzc2lhZ2F0ZQ0KDQpgYGANCkNvbmNsdXNpb25zOg0KDQpJbiBzaG9ydCwgV2F0ZXJnYXRlIGFuZCBSdXNzaWFnYXRlIGFyZSBjZXJ0YWlubHkgbm90IGFsaWtlLiBGb3Igb25lIHRoaW5nLCBXYXRlcmdhdGUgaGFzIGEgc3Vic3RhbnRpYWwgbnVtYmVyIG9mIHRob3NlIHdobyBwbGVhZCBndWlsdHksIGFuZCB3ZXJlIGNvbnZpY3RlZCAoNTIgZGVmZW5kYW50cykuIE9uIHRoZSBvdGhlciBoYW5kLCBSdXNzaWFnYXRlIG9ubHkgaGFzIDcgaW5kaXZpZHVhbHMgd2hvIHdlcmUgY29udmljdGVkIGFuZCBwbGVhZCBndWlsdHkgKG9ubHkgMSBwbGVhZCBndWlsdHkpDQoNCkl0IGlzIGltcG9ydGFudCB0byBjb25zaWRlciB0aGF0IGJlZm9yZSBQcmVzaWRlbnQgVHJ1bXAgbGVmdCBvZmZpY2UsIGhlIHBhcmRvbmVkIHRoZSBmb2xsb3dpbmcgZGVmZW5kYW50cyBmb3IgdGhlaXIgaW5kaWN0bWVudHMgaW4gUnVzc2lhZ2F0ZTogR2VvcmdlIFBhcGFkb3BvbG91cywgUGF1bCBNYW5hZm9ydCwgTWljaGFlbCBGbHlubiwgQWxleCBWYW4gRGVyIFp3YWFuLCBhbmQgTWljaGFlbCBDb2hlbi4NClByZXNpZGVudCBUcnVtcCBoYXMgYWxzbyBjb21tdXRlZCB0aGUgc2VudGVuY2Ugb2YgUm9nZXIgU3RvbmUgdmlhIHRoZSBncmFudCBvZiBjbGVtZW5jeS4gU2luY2UgdGhlc2UgYXJlIDYgaW5kaXZpZHVhbHMsIHRoYXQgbWVhbnMgb25seSBvbmUgaW5kaXZpZHVhbCByZW1haW5zIGZyb20gYmVpbmcgaW5kaWN0ZWQuIEFjY29yZGluZyB0byB0aGUgRE9KLCB0aGUgRHV0Y2ggTGF3eWVyIEFsZXggQ2FuIERlciBad2FhbiB3YXMgdGhlIGluZGl2aWR1YWwgd2hvIHBsZWFkIGd1aWx0eS4NCg0KQW5vdGhlciBpbXBvcnRhbnQgY29uc2lkZXJhdGlvbiBpcyB0aGUgZmFjdCB0aGF0IG1hbnkgb2YgdGhlIGluZGljdGVkIGluZGl2aWR1YWxzIGFyZSBhbm9ueW1vdXMgaW4gdGhpcyBkYXRhIHNldCwgYXMgdGhleSBhcmUgcmVmZmVycmVkIHRvIGFzICJSdXNzaWFuIE5hdGlvbmFscyIuIEkgd2FzIG5vdCBhYmxlIHRvIGZpbmQgd2hvIHRoZSBSdXNzaWFucyB3ZXJlIGluIHRoaXMgY2FzZSwgYW5kIHRoZXJlZm9yZSBjb3VsZCBub3QgZGV0ZXJtaW5lIGlmIHRoZXkgd2VyZSBwYXJkb25lZCBieSBQcmVzaWRlbnQgVHJ1bXAuDQoNClVsdGltYXRlbHksIHRoaXMgZGF0YSBzZXQsIHBhcnRpY3VsYXJseSB0aGUgUnVzc2lhZ2F0ZSBzdWJzZXQsIGlzIGZsYXdlZCBkdWUgdG8gdGhlIGxhY2sgb2YgdXBkYXRlZCBpbmZvcm1hdGlvbiBieSB0aGUgYXV0aG9yLiBJdCBoYXMgbm90IGJlZW4gdXBkYXRlZCBzaW5jZSBNYXJjaCAyMDE5LCBhbmQgbXVjaCBoYXMgY2hhbmdlZCBpbiB0aGUgb3V0Y29tZSBvZiB0aGlzIHRyaWFsIHNpbmNlIHRoZW4uIA0KDQpSZWNvbW1lbmRhdGlvbnM6IA0KSWYgcG9zc2libGUsIGl0IHdvdWxkIGJlIGFkdmlzYWJsZSB0byBjaGFuZ2UgdGhlIGRhdGEgZW50cmllcyB1bmRlciB0aGUgY29sdW1ucyBvZiBsZWdhbGl0eSBpbiBvcmRlciB0byB1cGRhdGUgdGhlIGxlZ2FsIHN0YXR1cyBvZiB0aGUgZGVmZW5kYW50cy4=