Directions

During ANLY 512 we will be studying the theory and practice of data visualization. We will be using R and the packages within R to assemble data and construct many different types of visualizations. Before we begin studying data visualizations we need to develop some data wrangling skills. We will use these skills to wrangle our data into a form that we can use for visualizations.

The objective of this assignment is to introduce you to R Studio, Rmarkdown, the tidyverse and more specifically the dplyr package.

Each question is worth 5 points.

To submit this homework you will create the document in Rstudio, using the knitr package (button included in Rstudio) and then submit the document to your Rpubs account. Once uploaded you will submit the link to that document on Canvas. Please make sure that this link is hyper linked and that I can see the visualization and the code required to create it.

Question #1

Use the nycflights13 package and the flights data frame to answer the following questions: a.What month had the highest proportion of cancelled flights? b.What month had the lowest?

library(nycflights13)


flights_mon <- flights %>% 
               group_by(month)%>%
               summarize(perc_canceled = sum(is.na(dep_time))/n()) %>%
               arrange(desc(perc_canceled))

flights_mon
## # A tibble: 12 × 2
##    month perc_canceled
##    <int>         <dbl>
##  1     2       0.0505 
##  2    12       0.0364 
##  3     6       0.0357 
##  4     7       0.0319 
##  5     3       0.0299 
##  6     4       0.0236 
##  7     5       0.0196 
##  8     1       0.0193 
##  9     8       0.0166 
## 10     9       0.0164 
## 11    11       0.00854
## 12    10       0.00817
# Answer
# a.Feburay has the highest proportion of cancelled flights
# b.October has the lowest

Question #2

Consider the following pipeline:

library(tidyverse)
# mtcars %>%
#  group_by(cyl) %>%
#  summarize(avg_mpg = mean(mpg)) %>%
#  filter(am == 1)

What is the problem with this pipeline? Answer: There is no am columns after group by

Question #3

Define two new variables in the Teams data frame in the pkg Lahman() package.

  1. batting average (BA). Batting average is the ratio of hits (H) to at-bats (AB)

  2. slugging percentage (SLG). Slugging percentage is total bases divided by at-bats (AB). To compute total bases, you get 1 for a single, 2 for a double, 3 for a triple, and 4 for a home run.

library(Lahman)
Teams$BA = Teams$H/Teams$AB
Teams$SLG = (Teams$H+Teams$X2B*2+Teams$X3B*3+Teams$HR*4)/Teams$AB

Question #4

Using the Teams data frame in the pkg Lahman() package. display the top-5 teams ranked in terms of slugging percentage (SLG) in Major League Baseball history. Repeat this using teams since 1969. Slugging percentage is total bases divided by at-bats.To compute total bases, you get 1 for a single, 2 for a double, 3 for a triple, and 4 for a home run.

Teams %>% filter(yearID>=1969) %>% 
          group_by(yearID) %>% 
          slice_max(order_by = SLG, n = 5)
## # A tibble: 265 × 50
## # Groups:   yearID [53]
##    yearID lgID  teamID franchID divID  Rank     G Ghome     W     L DivWin WCWin
##     <int> <fct> <fct>  <fct>    <chr> <int> <int> <int> <int> <int> <chr>  <chr>
##  1   1969 AL    BOS    BOS      E         3   162    81    87    75 N      <NA> 
##  2   1969 NL    CIN    CIN      W         3   163    81    89    73 N      <NA> 
##  3   1969 AL    BAL    BAL      E         1   162    81   109    53 Y      <NA> 
##  4   1969 AL    MIN    MIN      W         1   162    81    97    65 Y      <NA> 
##  5   1969 NL    PIT    PIT      E         3   162    81    88    74 N      <NA> 
##  6   1970 NL    CIN    CIN      W         1   162    81   102    60 Y      <NA> 
##  7   1970 AL    BOS    BOS      E         3   162    81    87    75 N      <NA> 
##  8   1970 NL    CHN    CHC      E         2   162    80    84    78 N      <NA> 
##  9   1970 NL    SFN    SFG      W         3   162    81    86    76 N      <NA> 
## 10   1970 NL    PIT    PIT      E         1   162    82    89    73 Y      <NA> 
## # … with 255 more rows, and 38 more variables: LgWin <chr>, WSWin <chr>,
## #   R <int>, AB <int>, H <int>, X2B <int>, X3B <int>, HR <int>, BB <int>,
## #   SO <int>, SB <int>, CS <int>, HBP <int>, SF <int>, RA <int>, ER <int>,
## #   ERA <dbl>, CG <int>, SHO <int>, SV <int>, IPouts <int>, HA <int>,
## #   HRA <int>, BBA <int>, SOA <int>, E <int>, DP <int>, FP <dbl>, name <chr>,
## #   park <chr>, attendance <int>, BPF <int>, PPF <int>, teamIDBR <chr>,
## #   teamIDlahman45 <chr>, teamIDretro <chr>, BA <dbl>, SLG <dbl>

Question #5

Use the Batting, Pitching, and People tables in the pkg Lahman() package to answer the following questions.

a.Name every player in baseball history who has accumulated at least 300 home runs (HR) and at least 300 stolen bases (SB). You can find the first and last name of the player in the Master data frame. Join this to your result along with the total home runs and total bases stolen for each of these elite players.

  1. Similarly, name every pitcher in baseball history who has accumulated at least 300 wins (W) and at least 3,000 strikeouts (SO).

  2. Identify the name and year of every player who has hit at least 50 home runs in a single season. Which player had the lowest batting average in that season?

BattingAcc <- Batting %>% group_by(playerID)%>%
              summarize(totSB = sum(SB),
                        totSO = sum(SO))

PitchingAcc <- Pitching %>% group_by(playerID)%>%
              summarize(totHR = sum(HR),
                        totW = sum(W))

# a. No player has accumulated at least 300 home runs (HR) and at least 300 stolen bases (SB)
select(People, playerID, nameFirst, nameLast) %>% 
left_join(BattingAcc, by=c("playerID"="playerID")) %>%
left_join(PitchingAcc, by=c("playerID"="playerID"))%>%
filter((totHR>=300)&(totSB>=300))
## [1] playerID  nameFirst nameLast  totSB     totSO     totHR     totW     
## <0 rows> (or 0-length row.names)
# b. No player has accumulated at least 300 wins (W) and at least 3,000 strikeouts (SO)
select(People, playerID, nameFirst, nameLast) %>% 
left_join(BattingAcc, by=c("playerID"="playerID")) %>%
left_join(PitchingAcc, by=c("playerID"="playerID"))%>%
filter((totW>=300)&(totSO>=3000))
## [1] playerID  nameFirst nameLast  totSB     totSO     totHR     totW     
## <0 rows> (or 0-length row.names)
# c. Babe Ruth has at least 50 home run in 1927 season
Batting %>% left_join(select(People, playerID, nameFirst, nameLast), by=c("playerID"="playerID")) %>% filter(yearID==1927 & HR >= 50) %>% select(nameFirst, nameLast)
##   nameFirst nameLast
## 1      Babe     Ruth
# A lot of player has 0 Runs Batteled in in seaon 1927
Batting %>% left_join(select(People, playerID, nameFirst, nameLast), by=c("playerID"="playerID")) %>% filter(yearID==1927) %>% arrange(RBI)%>% select(nameFirst, nameLast, RBI)
##        nameFirst    nameLast RBI
## 1          Lefty    Atkinson   0
## 2             Ed      Baecht   0
## 3            Win      Ballou   0
## 4          Jesse      Barnes   0
## 5            Red      Barnes   0
## 6           Dick     Bartell   0
## 7            Jim      Battle   0
## 8         Walter       Beall   0
## 9            Jim     Beckman   0
## 10            Hi        Bell   0
## 11         Frank     Bennett   0
## 12          Hank       Boney   0
## 13          Fred    Bratschi   0
## 14           Joe       Brown   0
## 15        Johnny     Burnett   0
## 16         Frank      Bushey   0
## 17    Bullet Joe        Bush   0
## 18           Guy    Cantrell   0
## 19        Virgil     Cheeves   0
## 20          John      Churry   0
## 21          Bill    Clarkson   0
## 22         Watty       Clark   0
## 23          Dick     Coffman   0
## 24          Bert        Cole   0
## 25           Hap     Collard   0
## 26        Johnny      Cooney   0
## 27           Bob     Cremins   0
## 28       Wayland        Dean   0
## 29         Buddy        Dear   0
## 30          Bill    Deitrick   0
## 31         Eddie        Dyer   0
## 32        Foster     Edwards   0
## 33          Mose      Eggert   0
## 34           Wes     Ferrell   0
## 35         Chick     Fewster   0
## 36          John     Freeman   0
## 37           Joe       Giard   0
## 38          Hank      Grampp   0
## 39          Kent  Greenfield   0
## 40          Fred       Haney   0
## 41           Don     Hankins   0
## 42         Bunny       Hearn   0
## 43          Bill      Hohman   0
## 44           Mul     Holland   0
## 45          Paul     Hopkins   0
## 46           Tex      Jeanes   0
## 47           Art     Johnson   0
## 48         Augie       Johns   0
## 49           Syl     Johnson   0
## 50          Dick       Jones   0
## 51          Buck      Jordan   0
## 52         Ralph        Judd   0
## 53         Marty       Karow   0
## 54          Benn        Karr   0
## 55          Tony    Kaufmann   0
## 56           Vic        Keen   0
## 57           Joe     Klinger   0
## 58          Jack      Knight   0
## 59        Herman       Layne   0
## 60         Clyde      Manion   0
## 61        Rabbit  Maranville   0
## 62         Firpo    Marberry   0
## 63           Bob      McGraw   0
## 64        Stuffy     McInnis   0
## 65           Hal      McKain   0
## 66         Dinny    McNamara   0
## 67          Hugh   McQuillan   0
## 68          Russ      Miller   0
## 69           Art       Mills   0
## 70        George    Mogridge   0
## 71         Randy       Moore   0
## 72        Johnny    Morrison   0
## 73        Skinny      O'Neal   0
## 74        Mickey      O'Neil   0
## 75         Ernie     Padgett   0
## 76         Homer        Peel   0
## 77           Red       Peery   0
## 78        Norman       Plitt   0
## 79           Ned      Porter   0
## 80           Art    Reinhart   0
## 81        Topper      Rigney   0
## 82         Jimmy        Ring   0
## 83         Oscar    Roettger   0
## 84         Wally    Roettger   0
## 85          Dick     Rudolph   0
## 86         Bobby      Schang   0
## 87         Tommy      Sewell   0
## 88           Bob     Shawkey   0
## 89           Red       Smith   0
## 90         Rufus       Smith   0
## 91        Sherry       Smith   0
## 92          Rudy     Sommers   0
## 93           Don      Songer   0
## 94           Don      Songer   0
## 95         Frank     Stewart   0
## 96         Lefty       Taber   0
## 97           Fay      Thomas   0
## 98          Vern   Underhill   0
## 99          Clay Van Alstyne   0
## 100         Bill      Walker   0
## 101          Jim      Walkup   0
## 102        Lefty     Weinert   0
## 103       Johnny       Welch   0
## 104           Ed       Wells   0
## 105         Buzz      Wetzel   0
## 106         Jack       White   0
## 107        Harry       Wilke   0
## 108        Lefty      Willis   0
## 109         John      Wilson   0
## 110          Ted   Wingfield   0
## 111          Ray        Wolf   0
## 112          Jim      Wright   0
## 113      Carroll      Yerkes   0
## 114         Pete    Appleton   1
## 115        Henry     Baldwin   1
## 116    Boom-Boom        Beck   1
## 117       Johnny      Berger   1
## 118         Josh    Billings   1
## 119         Lena  Blackburne   1
## 120       George  Blaeholder   1
## 121         Stew       Bolen   1
## 122         Herb     Bradley   1
## 123          Jim  Brillheart   1
## 124        Jumbo       Brown   1
## 125          Guy        Bush   1
## 126          Guy    Cantrell   1
## 127        Chuck      Corgan   1
## 128         Stan   Coveleski   1
## 129      General     Crowder   1
## 130         Nick      Cullop   1
## 131          Joe      Dawson   1
## 132      Wayland        Dean   1
## 133         Bill        Doak   1
## 134         Jess       Doyle   1
## 135         Chet        Falk   1
## 136          Jim    Faulkner   1
## 137       Merwin    Jacobson   1
## 138         Jing     Johnson   1
## 139         Carl        Lind   1
## 140     Carlisle  Littlejohn   1
## 141          Del    Lundgren   1
## 142          Roy    Mahaffey   1
## 143      William    Marriott   1
## 144         Carl        Mays   1
## 145         Doug     McWeeny   1
## 146          Guy    Morrison   1
## 147       Johnny      Mostil   1
## 148       George      Murray   1
## 149        Ernie      Nevers   1
## 150         Chet     Nichols   1
## 151        Eddie      Onslow   1
## 152       Norman       Plitt   1
## 153       Luther         Roy   1
## 154         Herb      Thomas   1
## 155        Dutch      Ulrich   1
## 156        Augie       Walsh   1
## 157      Pee-Wee   Wanninger   1
## 158          Bob         Way   1
## 159         Tony      Welzer   1
## 160       Claude  Willoughby   1
## 161          Kid     Willson   1
## 162          Hal      Wiltse   1
## 163         Emil         Yde   1
## 164          Tom     Zachary   1
## 165         Neal       Baker   2
## 166      Charlie       Bates   2
## 167         Jack     Bentley   2
## 168      Garland     Braxton   2
## 169        Bobby       Burke   2
## 170   Bullet Joe        Bush   2
## 171          Ben    Cantwell   2
## 172          Art     Decatur   2
## 173       Bernie  DeViveiros   2
## 174         Rube    Ehrhardt   2
## 175         Alex    Ferguson   2
## 176       George      Gerken   2
## 177        Grant      Gillis   2
## 178          Hal   Goldsmith   2
## 179       George       Grant   2
## 180          Sid      Graves   2
## 181          Sam        Gray   2
## 182         Kent  Greenfield   2
## 183       Jackie       Hayes   2
## 184          Ken    Holloway   2
## 185        Elmer      Jacobs   2
## 186         Tony    Kaufmann   2
## 187          Ray        Kolp   2
## 188        Dutch      Levsen   2
## 189         Hugh   McQuillan   2
## 190          Joe     Mellana   2
## 191       Johnny      Miljus   2
## 192        Wilcy       Moore   2
## 193          Ray        Moss   2
## 194          Art        Nehf   2
## 195        Harry   O'Donnell   2
## 196          Joe        Pate   2
## 197        Jesse       Petty   2
## 198          Ike      Powers   2
## 199        Flint        Rhem   2
## 200      Charlie   Robertson   2
## 201        Rusty    Saunders   2
## 202          Ray      Schalk   2
## 203        Clyde   Sukeforth   2
## 204        Dutch       Ussat   2
## 205        Larry      Benton   3
## 206      Sheriff       Blake   3
## 207         Earl       Clark   3
## 208          Joe      Cronin   3
## 209      General     Crowder   3
## 210         Mike    Cvengros   3
## 211       Howard       Ehmke   3
## 212         Fred  Frankhouse   3
## 213       Heinie        Groh   3
## 214         Slim     Harriss   3
## 215      Sad Sam       Jones   3
## 216          Red       Kress   3
## 217          Art        Nehf   3
## 218       Mickey      O'Neil   3
## 219        Eddie      Rommel   3
## 220           Ed     Sicking   3
## 221        Lefty     Stewart   3
## 222        Myles      Thomas   3
## 223       Johnny       Werts   3
## 224         Earl   Whitehill   3
## 225       Virgil      Barnes   4
## 226        Larry      Benton   4
## 227          Moe        Berg   4
## 228         Fred    Brickell   4
## 229          Hal     Carlson   4
## 230         Adam   Comorosky   4
## 231          Red       Faber   4
## 232          Sam      Gibson   4
## 233       Johnny        Gill   4
## 234        Percy       Jones   4
## 235          Pat     McNulty   4
## 236         Bill       Moore   4
## 237          Bob      Osborn   4
## 238         Babe     Pinelli   4
## 239          Red     Ruffing   4
## 240         Jack     Russell   4
## 241       Stuffy     Stewart   4
## 242        Tommy    Thevenow   4
## 243      Overton     Tremper   4
## 244        Frank       Welch   4
## 245      Charlie     Barnabe   5
## 246        Ownie     Carroll   5
## 247          Joe    Genewich   5
## 248          Jim       Hamby   5
## 249    Baby Doll    Jacobson   5
## 250          Hod    Lisenbee   5
## 251        Jakie         May   5
## 252          Bob      McGraw   5
## 253         Bill     Sherdel   5
## 254          Lil      Stoner   5
## 255          Guy      Sturdy   5
## 256        Arlie     Tarbert   5
## 257        Elmer       Yoter   5
## 258         Pete   Alexander   6
## 259          Rip     Collins   6
## 260        Sarge    Connally   6
## 261        Jimmy      Cooney   6
## 262         Pete     Donohue   6
## 263        Jumbo     Elliott   6
## 264          Ray  Flaskamper   6
## 265     Burleigh      Grimes   6
## 266       Willis      Hudlin   6
## 267         Tony    Kaufmann   6
## 268        Danny   MacFayden   6
## 269          Les        Mann   6
## 270          Lee     Meadows   6
## 271         Jake      Miller   6
## 272     Clarence    Mitchell   6
## 273         Herb     Pennock   6
## 274       George     Pipgras   6
## 275         Jack       Quinn   6
## 276          Joe      Shaute   6
## 277       George       Smith   6
## 278          Les   Sweetland   6
## 279         Herb      Thomas   6
## 280          Sam        West   6
## 281          Tom     Zachary   6
## 282        Chick       Autry   7
## 283      Garland     Buckeye   7
## 284        Dutch       Henry   7
## 285          Sam    Langford   7
## 286        Irish      Meusel   7
## 287        Buddy        Myer   7
## 288          Hub      Pruett   7
## 289         Carl    Reynolds   7
## 290         Nick      Cullop   8
## 291      Freddie Fitzsimmons   8
## 292        Lefty       Grove   8
## 293        Jesse      Haines   8
## 294         Otis      Miller   8
## 295        Glenn       Myatt   8
## 296      Charlie        Root   8
## 297        Tommy      Thomas   8
## 298        Ollie      Tucker   8
## 299         Elam   Vangilder   8
## 300      Pee-Wee   Wanninger   8
## 301        Julie        Wera   8
## 302          Vic    Aldridge   9
## 303          Hal     Carlson   9
## 304         Mike     Gazella   9
## 305        Waite        Hoyt   9
## 306         Dolf       Luque   9
## 307          Ted       Lyons   9
## 308         Eppa       Rixey   9
## 309          Red    Rollings   9
## 310         Merv        Shea   9
## 311        Dazzy       Vance   9
## 312        Benny    Bengough  10
## 313       Howard     Freigau  10
## 314         Bump      Hadley  10
## 315       Carmen        Hill  10
## 316       Walter     Johnson  10
## 317          Ray      Kremer  10
## 318          Les        Mann  10
## 319        Pinky   Pittenger  10
## 320          Jim       Poole  10
## 321        Dutch     Ruether  10
## 322        Urban     Shocker  10
## 323          Bob       Smith  10
## 324         Luke       Urban  10
## 325         Rube     Walberg  10
## 326         Dick     Attreau  11
## 327          Ike       Boone  11
## 328      Charlie  Hargreaves  11
## 329       Bernie        Neis  11
## 330          Art       Ruble  11
## 331          Leo       Dixon  12
## 332         Fred       Haney  12
## 333        Ernie     Orsatti  12
## 334          Val    Picinich  12
## 335          Pid       Purdy  12
## 336        Ernie     Wingard  12
## 337          Dud      Branom  13
## 338        Danny       Clark  13
## 339         Babe      Ganzel  13
## 340    Baby Doll    Jacobson  13
## 341       Topper      Rigney  13
## 342          Roy     Spencer  13
## 343          Ted Blankenship  14
## 344         Jack    Cummings  14
## 345       Bubber     Jonnard  14
## 346         Zack      Taylor  14
## 347       George        Uhle  14
## 348        Eddie     Collins  15
## 349        Jimmy      Cooney  15
## 350         Milt      Gaston  15
## 351         Mike    Gonzalez  15
## 352           Cy     Perkins  15
## 353        Eddie        Pick  15
## 354       Cuckoo Christensen  16
## 355         Earl     McNeely  16
## 356          Ben     Paschal  16
## 357         Earl      Sheely  16
## 358          Hal       Rhyne  17
## 359         Jack       Scott  17
## 360       Sloppy    Thurston  17
## 361        Chick      Tolson  17
## 362           Ty       Tyson  17
## 363        Butch     Henline  18
## 364       Bernie        Neis  18
## 365           Al       Nixon  18
## 366          Bob   O'Farrell  18
## 367        Frank      Gibson  19
## 368       Heinie     Mueller  19
## 369          Mel         Ott  19
## 370       Freddy    Spurgeon  19
## 371        Specs    Toporcer  19
## 372        Ethan       Allen  20
## 373         Buck      Crouse  20
## 374         Jake     Flowers  20
## 375       Jimmie        Foxx  20
## 376          Doc    Gautreau  20
## 377          Ray    Morehart  20
## 378           Al       Wingo  20
## 379         Hank     DeBerry  21
## 380           Al    DeVormer  21
## 381 High Pockets       Kelly  21
## 382         Andy       Reese  21
## 383         Pete       Scott  21
## 384       Jigger       Statz  21
## 385         Zack      Taylor  21
## 386          Max      Bishop  22
## 387        Chick    Galloway  22
## 388        Steve     O'Neill  22
## 389        Roger Peckinpaugh  23
## 390       Johnny     Bassler  24
## 391         Fred     Hofmann  24
## 392    Baby Doll    Jacobson  24
## 393         Jack       Smith  24
## 394       Bennie        Tate  24
## 395        Billy    Zitzmann  24
## 396       Cedric       Durst  25
## 397          Ike    Eichrodt  25
## 398       Johnny   Grabowski  25
## 399        Cliff   Heathcote  25
## 400         Earl       Smith  25
## 401         Dick    Spalding  25
## 402          Ski     Melillo  26
## 403        Harry     McCurdy  27
## 404       Johnny        Neun  27
## 405        Lloyd       Waner  27
## 406         Cleo     Carlyle  28
## 407        Woody     English  28
## 408       Bernie     Friberg  28
## 409          Red       Lucas  28
## 410        Billy      Rogell  28
## 411       Heinie     Schuble  28
## 412      Spencer       Adams  29
## 413          Ray      Blades  29
## 414     Herschel     Bennett  30
## 415        Frank      Snyder  30
## 416         Dave    Bancroft  31
## 417         Kiki      Cuyler  31
## 418       Grover     Hartley  31
## 419         Dick      Burrus  32
## 420       Shanty       Hogan  32
## 421        Eddie       Moore  32
## 422       Johnny     Schulte  32
## 423       Johnny       Mokan  33
## 424          Doc     Farrell  34
## 425        Lance   Richbourg  34
## 426         Fred     Schulte  34
## 427      Bubbles    Hargrave  35
## 428          Pat     Collins  36
## 429         Bill  Hunnefield  36
## 430      Charlie    Jamieson  36
## 431         Jack    Rothrock  36
## 432          Bob     Barrett  38
## 433         Zack       Wheat  38
## 434        Frank    O'Rourke  39
## 435        Bobby      Reeves  39
## 436        Billy  Southworth  39
## 437        Larry     Woodall  39
## 438          Lew     Fonseca  40
## 439       Johnny      Hodapp  40
## 440          Jay   Partridge  40
## 441         Jack       Tobin  40
## 442         Walt      French  41
## 443         Rube      Lutzke  41
## 444        Wally        Pipp  41
## 445           Lu        Blue  42
## 446        Wally      Schang  42
## 447          Joe       Dugan  43
## 448        Clyde        Beck  44
## 449        Wally      Gerber  45
## 450         Jack      Warner  45
## 451       Jimmie      Wilson  45
## 452          Hod        Ford  46
## 453         Andy        High  46
## 454         Bill       Lamar  47
## 455        Buddy        Myer  47
## 456       Johnny       Gooch  48
## 457       Sparky       Adams  49
## 458       Hughie       Critz  49
## 459       Heinie        Sand  49
## 460        Wally      Shaner  49
## 461       Taylor     Douthit  50
## 462       Harvey    Hendrick  50
## 463          Joe       Boley  52
## 464        Muddy        Ruel  52
## 465         Phil        Todt  52
## 466         Earl        Webb  52
## 467          Bud      Clancy  53
## 468         Jack    Fournier  53
## 469         Luke      Sewell  53
## 470        Clyde    Barnhart  54
## 471          Max       Carey  54
## 472        Jimmy       Welsh  54
## 473        Chuck     Dressen  55
## 474        Bucky      Harris  55
## 475        Aaron        Ward  56
## 476       Johnny      Butler  57
## 477          Gus       Felix  57
## 478          Doc     Farrell  58
## 479      Freddie   Lindstrom  58
## 480          Edd       Roush  58
## 481       Willie        Kamm  59
## 482       Jackie     Tavener  59
## 483        Jimmy       Dykes  60
## 484      Charlie   Gehringer  61
## 485         Alex     Metzler  61
## 486         Mark      Koenig  62
## 487        Chick       Hafey  63
## 488        Earle       Combs  64
## 489          Les        Bell  65
## 490          Sam        Rice  65
## 491        Ossie      Bluege  66
## 492       George    Grantham  66
## 493       Wattie        Holm  66
## 494         Bill       Regan  66
## 495        Harry        Rice  68
## 496          Ira   Flagstead  69
## 497        Marty     McManus  69
## 498       Fresco    Thompson  70
## 499          Joe       Judge  71
## 500          Joe      Harris  73
## 501         Babe      Herman  73
## 502         Tris     Speaker  73
## 503      Charlie       Grimm  74
## 504        Homer       Summa  74
## 505          Ken    Williams  74
## 506        Eddie       Brown  75
## 507         Bing      Miller  75
## 508         Russ Wrightstone  75
## 509         Rube    Bressler  77
## 510       George       Burns  78
## 511      Frankie      Frisch  78
## 512       Mickey    Cochrane  80
## 513        Gabby    Hartnett  80
## 514         Curt      Walker  80
## 515        Sammy        Hale  81
## 516        Riggs  Stephenson  82
## 517         Bill     Barrett  83
## 518         Bibb        Falk  83
## 519       Freddy       Leach  83
## 520       George      Harper  87
## 521       Heinie      Manush  90
## 522          Joe      Sewell  92
## 523           Ty        Cobb  93
## 524       George      Sisler  97
## 525       Travis     Jackson  98
## 526           Cy    Williams  98
## 527         Tony     Lazzeri 102
## 528          Bob      Meusel 103
## 529        Glenn      Wright 105
## 530          Pie     Traynor 106
## 531           Al     Simmons 108
## 532          Bob  Fothergill 114
## 533        Goose      Goslin 120
## 534        Harry    Heilmann 120
## 535         Bill       Terry 121
## 536          Jim   Bottomley 124
## 537       Rogers     Hornsby 125
## 538         Hack      Wilson 129
## 539         Paul       Waner 131
## 540         Babe        Ruth 164
## 541          Lou      Gehrig 175