Team: Alabama

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

Category <- c("Games", "Minutes")
Value <- c(34,33.1)
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.606, 0.559, .541, 0.337, 26, .49, .99, 24.9, .149, .096, .246, 8.6, 4.4)
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,7,9,11,13), fill = "orange") %>%
  gt_highlight_rows( rows = c(3,10,12), fill = "green")
Stats Values
TS% 0.606
EFG% 0.559
3PA Rate 0.541
FTA Rate 0.337
USG% 26
Ast/USG 0.49
Ast/TO 0.99
Per 24.9
OWS/40 0.149
DWS/40 0.096
WS/40 0.246
OBPM 8.6
DBPM 4.4

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("High Lottery", "Starter", "7")

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

Roles

Side <- c("Offense", "Defense")
Current <- c("Isolation Scorer/Secondary Creator", "On Ball Container")
Projected <- c("Spacer/Secondary Creator", "On Ball Container")
cbind(Side,Current,Projected) %>% reactable(theme = espn()) 

Best/Worst Skill

Skill <- c("Best Skill", "Worst Skill")
Player <- c("Shot", "Strength")
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", "Functional", "Functional", "Functional", "Functional", "Impactful", "Impactful", "Functional", "Functional", "Functional", "Functional","Liability", "Functional", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(6,7), fill = "green") %>%
  gt_highlight_rows( rows = c(1,2,3,4,5,8,10,11,13,9,14), fill = "orange") %>%
  gt_highlight_rows( rows = c(12), fill = "red")
Category Evaluation
Spacing Awareness Functional
Pattern Recognition Functional
Anticipation Functional
Cognitive Load Functional
Communication Functional
Balance Impactful
Coordination Impactful
Reflexes Functional
Stamina Functional
Change of Direction Functional
Change of Pace Functional
Strength Liability
Vertical Plane Functional
Pliability Functional