Team: South Carolina

library(tidyverse)
library(gt)
library(gtExtras)
library(dplyr)
library(reactable)
library(reactablefmtr)

Category <- c("Games", "Minutes")
Value <- c(26,31.3)
cbind(Category, Value) %>% reactable( theme = espn())

Notes:

Strengths

Weaknesses

Questions

*Initially I did mention that I liked him more than Brandon Miller, this is no longer the case. I do think that Jackson has a higher ceiling but Miller is much closer to being an NBA level player.

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.473, 0.450, .368, 0.262, 30.6, 0.21, .30, 15.3, 0.015, 0.030, 0.044, 1.2, -1.2)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(6,7,13), fill = "red") %>%
  gt_highlight_rows( rows = c(1,2,4,8,9,10,11), fill = "orange") %>%
  gt_highlight_rows( rows = c(3,5,12), fill = "green")
Stats Values
TS% 0.473
EFG% 0.45
3PA Rate 0.368
FTA Rate 0.262
USG% 30.6
Ast/USG 0.21
Ast/TO 0.3
Per 15.3
OWS/40 0.015
DWS/40 0.03
WS/40 0.044
OBPM 1.2
DBPM -1.2

*Minutes have plummeted last two games.

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Lottery/Mid First", "High Level Role Player", 17)

cbind(Category,Value) %>% reactable(theme = espn(),)

Roles

Side <- c("Offense", "Defense")
Current <- c("Shot Creator", "Switchable")
Projected <- c("Secondary Creator", "Switchable")
cbind(Side,Current,Projected) %>% reactable(theme = espn()) 

Best/Worst Skill

Skill <- c("Best Skill", "Worst Skill")
Player <- c("Shot Creation", "Off Ball Defense")
cbind(Skill,Player) %>% reactable(theme = espn())

Athleticism (mental and physical)

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", "Liability", "Liability", "Functional", "Functional", "Functional", "Impactful", "Functional", "Functional", "Functional", "Functional", "Functional", "Functional", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(7), fill = "green") %>%
  gt_highlight_rows( rows = c(1,4,5,6,8,9,10,11,12,13,14), fill = "orange") %>%
  gt_highlight_rows( rows = c(2,3),  fill = "red")
Category Evaluation
Spacing Awareness Functional
Pattern Recognition Liability
Anticipation Liability
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 Functional
Pliability Functional