Team: Syracuse

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

Category <- c("Games", "Minutes")
Value <- c(30,33.2)
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.533, 0.476, .168, 0.463, 27, "-", 1.96, 20.3, "-", "-", .125, 2.1, .4)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(3), fill = "red") %>%
  gt_highlight_rows( rows = c(1,2,5,6,8,9,10,11,12,13), fill = "orange") %>%
  gt_highlight_rows( rows = c(4,7), fill = "green")
Stats Values
TS% 0.533
EFG% 0.476
3PA Rate 0.168
FTA Rate 0.463
USG% 27
Ast/USG -
Ast/TO 1.96
Per 20.3
OWS/40 -
DWS/40 -
WS/40 0.125
OBPM 2.1
DBPM 0.4

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Late First/Early Second", "Sporatic Bench Option", "-")

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

Roles

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

Best/Worst Skill

Skill <- c("Best Skill", "Worst Skill")
Player <- c("Downhill Driving", "Positional Size/Shot")
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", "Functional", "Functional", "Functional","Functional", "Impactful", "Impactful", "Liability", "Functional", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(10,11), fill = "green") %>%
  gt_highlight_rows( rows = c(1,2,3,4,5,6,7,8,9,13,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 Functional
Coordination Functional
Reflexes Functional
Stamina Functional
Change of Direction Impactful
Change of Pace Impactful
Strength Liability
Vertical Plane Functional
Pliability Functional