Team: South Carolina

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

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

Notes:

Strengths

Weaknesses

Questions

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.474, 0.451, .355, 0.233, 29.7, 0.19, .31, 16.1, 0.025, 0.032, 0.057, 1.3, -1.6)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(1,2,4,6,7,13), fill = "red") %>%
  gt_highlight_rows( rows = c(8,9,10,11), fill = "orange") %>%
  gt_highlight_rows( rows = c(3,5,12), fill = "green")
Stats Values
TS% 0.474
EFG% 0.451
3PA Rate 0.355
FTA Rate 0.233
USG% 29.7
Ast/USG 0.19
Ast/TO 0.31
Per 16.1
OWS/40 0.025
DWS/40 0.032
WS/40 0.057
OBPM 1.3
DBPM -1.6

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Lottery", "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", "Drifts around perimeter")
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", "Functional", "Functional", "Functional", "Functional", "Functional", "Impactful", "Functional", "Functional", "Functional", "Functional", "Functional", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(11,12,13), fill = "green") %>%
  gt_highlight_rows( rows = c(1,4,5,6,7,8,9,10,14), fill = "orange") %>%
  gt_highlight_rows( rows = c(2,3), fill = "red")
Category Evaluation
Spacing Awareness Functional
Pattern Recognition Liability
Anticipation Functional
Cognitive Load Functional
Communication Functional
Balance Functional
Coordination Functional
Reflexes Impactful
Stamina Functional
Change of Direction Functional
Change of Pace Functional
Strength Functional
Vertical Plane Functional
Pliability Functional