Team: Ohio St.
library(tidyverse)
library(gt)
library(gtExtras)
library(dplyr)
library(reactable)
library(reactablefmtr)
Category <- c("Games", "Minutes")
Value <- c(27,23.9)
cbind(Category, Value) %>% reactable( theme = espn())
Notes:
Strengths
Weaknesses
Questions
Level of playmaking? I don’t think he has the length or athleticism to play off the ball, and while he is a high level shot maker, but I don’t trust his vision/decision making enough to be a lead guard. I think his best role would be a score first sparkplug guard off the bench.
Defense? He certainly is an offense first player right now, and while he is not an elite athlete, his strength gives him a viable path to being a functional team defender.
Stats <- c("TS%", "EFG%", "3PA Rate", "FTA Rate", "USG%", "Ast/USG", "Ast/TO", "Per", "OWS/40", "DWS/40", "WS/40", "OBPM", "DBPM")
Values <- c(0.592, 0.561, .370, 0.257, 34.3, 0.30, .51, 26.7, 0.143, 0.056, 0.198, 8.2, .9)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
gt_highlight_rows( rows = c(6,10), fill = "red") %>%
gt_highlight_rows( rows = c(1,2,3,4,5,8,7,13,11), fill = "orange") %>%
gt_highlight_rows( rows = c(9,12), fill = "green")
| Stats | Values |
|---|---|
| TS% | 0.592 |
| EFG% | 0.561 |
| 3PA Rate | 0.37 |
| FTA Rate | 0.257 |
| USG% | 34.3 |
| Ast/USG | 0.3 |
| Ast/TO | 0.51 |
| Per | 26.7 |
| OWS/40 | 0.143 |
| DWS/40 | 0.056 |
| WS/40 | 0.198 |
| OBPM | 8.2 |
| DBPM | 0.9 |
Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Mid First", "Role Player", 23.5)
cbind(Category,Value) %>% reactable(theme = espn(),)
Side <- c("Offense", "Defense")
Current <- c("Isolation Scorer", "On Ball Container")
Projected <- c("Isolation Scorer", "On Ball Container/Right Place")
cbind(Side,Current,Projected) %>% reactable(theme = espn())
Skill <- c("Best Skill", "Worst Skill")
Player <- c("Contested Shot Making", "Verical Explosion")
cbind(Skill,Player) %>% reactable(theme = espn())
Category <- c("Spacing Awareness", "Pattern Recognition", "Anticipation", "Cognitive Load", "Communication", "Balance", "Coordination", "Reflexes", "Stamina", "Change of Direction", "Change of Pace", "Strength", "Vertical Plane", "Pliability")
Evaluation <- c("Functional", "Functional", "Functional", "Functional", "Functional", "Functional", "Impactful", "Functional", "Functional", "Functional", "Functional", "Functional", "Liability", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
gt_highlight_rows( rows = c(7), fill = "green") %>%
gt_highlight_rows( rows = c(1,2,3,4,5,6,8,9,10,11,12,14), fill = "orange") %>%
gt_highlight_rows( rows = c(13), fill = "red")
| Category | Evaluation |
|---|---|
| Spacing Awareness | Functional |
| Pattern Recognition | Functional |
| Anticipation | Functional |
| Cognitive Load | Functional |
| Communication | Functional |
| Balance | Functional |
| Coordination | Impactful |
| Reflexes | Functional |
| Stamina | Functional |
| Change of Direction | Functional |
| Change of Pace | Functional |
| Strength | Functional |
| Vertical Plane | Liability |
| Pliability | Functional |