Source: Lahman Database

Data gathered from 1871-2022.

batting1871to2022=batting %>% 
  dplyr::rename(Games=G,Runs=R,Hits=H,Doubles=X2B,Triples=X3B,HRuns=HR,Stolen_Bases=SB,Caught_Stealing=CS,Base_on_Balls=BB,Strikeouts=SO,League=lgID,At_Bats=AB,Intentional_Walks=IBB,Hit_by_Pitch=HBP,Sacrifice_Hits=SH,Sacrifice_Flies=SF
)

1). Who has the most stolen bases?

batting1871to2022 %>% 
  group_by(playerID,teamID) %>% 
  summarise(Stolen_Bases=max(Stolen_Bases)) %>% 
  arrange(desc(Stolen_Bases))

nicolhu01 of CN2 with 138.

2). Who struck out the most?

batting1871to2022 %>% 
  group_by(playerID,teamID) %>% 
  summarise(Strikeouts=max(Strikeouts)) %>% 
  arrange(desc(Strikeouts))

reynoma01 at ARI with 223.

3). Who has the most triples?

batting1871to2022 %>% 
  group_by(playerID,teamID) %>% 
  summarise(Triples=max(Triples)) %>% 
  arrange(desc(Triples))

wilsch01 at PIT with 36.

4). Who has the most doubles?

batting1871to2022 %>% 
  group_by(playerID,teamID) %>% 
  summarise(Doubles=max(Doubles)) %>% 
  arrange(desc(Doubles))

webbea01 at BOS with 67.

5). Who has the most hits?

batting1871to2022 %>% 
  group_by(playerID,teamID) %>% 
  summarise(Hits=max(Hits)) %>% 
  arrange(desc(Hits))

suzukic01 at SEA with 262.

6). Year with the most stolen bases?

batting1871to2022 %>% 
  group_by(yearID) %>% 
  summarise(Stolen_Bases=max(Stolen_Bases)) %>% 
  arrange(desc(Stolen_Bases))

1887 with 138.

7). Year with the most caught stealing?

batting1871to2022 %>% 
  group_by(yearID) %>% 
  summarise(Caught_Stealing=max(Caught_Stealing)) %>% 
  arrange(desc(Caught_Stealing))

1982 with 42.

sessionInfo()
## R version 4.3.0 alpha (2023-04-01 r84141 ucrt)
## Platform: x86_64-w64-mingw32/x64 (64-bit)
## Running under: Windows 10 x64 (build 19045)
## 
## Matrix products: default
## 
## 
## locale:
## [1] LC_COLLATE=English_United States.utf8 
## [2] LC_CTYPE=English_United States.utf8   
## [3] LC_MONETARY=English_United States.utf8
## [4] LC_NUMERIC=C                          
## [5] LC_TIME=English_United States.utf8    
## 
## time zone: America/New_York
## tzcode source: internal
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
##  [1] rio_0.5.29         performance_0.10.3 readxl_1.4.2       janitor_2.2.0     
##  [5] lubridate_1.9.2    forcats_1.0.0      stringr_1.5.0      dplyr_1.1.1       
##  [9] purrr_1.0.1        readr_2.1.4        tidyr_1.3.0        tibble_3.2.1      
## [13] tidyverse_2.0.0    report_0.5.7       ggplot2_3.4.1     
## 
## loaded via a namespace (and not attached):
##  [1] sass_0.4.5        utf8_1.2.3        generics_0.1.3    stringi_1.7.12   
##  [5] digest_0.6.31     hms_1.1.3         magrittr_2.0.3    evaluate_0.20    
##  [9] grid_4.3.0        timechange_0.2.0  fastmap_1.1.1     jsonlite_1.8.4   
## [13] cellranger_1.1.0  zip_2.3.0         fansi_1.0.4       scales_1.2.1     
## [17] jquerylib_0.1.4   cli_3.6.1         rlang_1.1.0       munsell_0.5.0    
## [21] cachem_1.0.7      yaml_2.3.7        withr_2.5.0       tools_4.3.0      
## [25] tzdb_0.3.0        colorspace_2.1-0  curl_5.0.0        vctrs_0.6.1      
## [29] R6_2.5.1          lifecycle_1.0.3   snakecase_0.11.0  foreign_0.8-84   
## [33] insight_0.19.2    pkgconfig_2.0.3   bslib_0.4.2       pillar_1.9.0     
## [37] openxlsx_4.2.5.2  gtable_0.3.3      glue_1.6.2        data.table_1.14.8
## [41] Rcpp_1.0.10       xfun_0.38         haven_2.5.2       tidyselect_1.2.0 
## [45] knitr_1.42        rstudioapi_0.14   htmltools_0.5.5   rmarkdown_2.21   
## [49] compiler_4.3.0