Team: Illinois
library(tidyverse)
library(gt)
library(gtExtras)
library(dplyr)
library(reactable)
library(reactablefmtr)
Category <- c("Games", "Minutes")
Value <- c(23,31.2)
cbind(Category, Value) %>% reactable( theme = espn())
Notes:
Strengths
Weaknesses
Questions
Is shot a threat? While he is definitely confident in his 3pt shot (even well beyond the line), his 3pt numbers arenโt impressive but I believe that is mostly due to poor shot selection. And in a smaller offensive role, I am confident his shot selection will improve.
What position? He has spent time at the 4 and 5 while at Illinois which I think will be the same in the pros. But he will need to work on his post game in order to take advantage of smaller defenders and switches.
It is important to note that he has a short neck so he is a big 6โ10.
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.519, 0.494, .511, 0.317, 18.3, .98, 1.22, 15.3, 0.040, 0.095, 0.139, 2.8, 3.5)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
gt_highlight_rows( rows = c(), fill = "red") %>%
gt_highlight_rows( rows = c(1,2,4,5,6,8,9,11,12,13), fill = "orange") %>%
gt_highlight_rows( rows = c(3,7,10), fill = "green")
| Stats | Values |
|---|---|
| TS% | 0.519 |
| EFG% | 0.494 |
| 3PA Rate | 0.511 |
| FTA Rate | 0.317 |
| USG% | 18.3 |
| Ast/USG | 0.98 |
| Ast/TO | 1.22 |
| Per | 15.3 |
| OWS/40 | 0.04 |
| DWS/40 | 0.095 |
| WS/40 | 0.139 |
| OBPM | 2.8 |
| DBPM | 3.5 |
Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Late/Mid First", "Role Player", 29.33)
cbind(Category,Value) %>% reactable(theme = espn(),)
Side <- c("Offense", "Defense")
Current <- c("Spacer/Creator", "Switchable/Anchor")
Projected <- c("Spacer", "Switchable")
cbind(Side,Current,Projected) %>% reactable(theme = espn())
Skill <- c("Best Skill", "Worst Skill")
Player <- c("Defensive postitioning", "Shot Selection")
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", "Functional", "Functional", "Functional", "Functional", "Functional", "Functional", "Impactful", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
gt_highlight_rows( rows = c(), fill = "green") %>%
gt_highlight_rows( rows = c(1,2,3,4,5,6,8,7,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 | Functional |
| Reflexes | Functional |
| Stamina | Functional |
| Change of Direction | Functional |
| Change of Pace | Functional |
| Strength | Functional |
| Vertical Plane | Impactful |
| Pliability | Functional |