Team: NC State

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

Category <- c("Games", "Minutes")
Value <- c(25,34)
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.501, 0.468, .526, 0.299, 30, .85, 1.97, 20.1, 0.94, 0.061, 0.155, 4.2, 1)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(), fill = "red") %>%
  gt_highlight_rows( rows = c(1,9,2,3,4,5,6,7,8,10,11,12,13), fill = "orange") %>%
  gt_highlight_rows( rows = c(3,7), fill = "green")
Stats Values
TS% 0.501
EFG% 0.468
3PA Rate 0.526
FTA Rate 0.299
USG% 30
Ast/USG 0.85
Ast/TO 1.97
Per 20.1
OWS/40 0.94
DWS/40 0.061
WS/40 0.155
OBPM 4.2
DBPM 1

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Second Round", "Deep Bench Option", 19.25)

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

Roles

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

Best/Worst Skill

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