Team: Gonzaga

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

Category <- c("Games", "Minutes")
Value <- c(31,31.6)
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.629, 0.621, .050, 0.508, 29.7, .61, 1.24, 30.3, .184, .053, .241, 7.7, 1.4)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(3), fill = "red") %>%
  gt_highlight_rows( rows = c(4,5,6,8,9,10,11,13), fill = "orange") %>%
  gt_highlight_rows( rows = c(1,2,7,12), fill = "green")
Stats Values
TS% 0.629
EFG% 0.621
3PA Rate 0.05
FTA Rate 0.508
USG% 29.7
Ast/USG 0.61
Ast/TO 1.24
Per 30.3
OWS/40 0.184
DWS/40 0.053
WS/40 0.241
OBPM 7.7
DBPM 1.4

Draft Value

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

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

Roles

Side <- c("Offense", "Defense")
Current <- c("Primary Creator", "Anchor")
Projected <- c("Isolation Scorer", "Right Place")
cbind(Side,Current,Projected) %>% reactable(theme = espn()) 

Best/Worst Skill

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