Team: Houston

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

Category <- c("Games", "Minutes")
Value <- c(17,24.5)
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.548, 0.527, .205, 0.212, 21.9, 0.60, 1.67, 24.2, 0.135, 0.144, 0.279, 5, 5.3)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(1,2,4), fill = "red") %>%
  gt_highlight_rows( rows = c(3,5,8,9,12,13), fill = "orange") %>%
  gt_highlight_rows(rows = c(6,7,10,11), fill = "green")
Stats Values
TS% 0.548
EFG% 0.527
3PA Rate 0.205
FTA Rate 0.212
USG% 21.9
Ast/USG 0.6
Ast/TO 1.67
Per 24.2
OWS/40 0.135
DWS/40 0.144
WS/40 0.279
OBPM 5
DBPM 5.3

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Lottery", "High Level Role Player", 10.5)

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

Roles

Side <- c("Offense", "Defense")
Current <- c("Spacer/Isolation Scorer", "Switchable/Anchor")
Projected <- c("Shot Creator", "Switchable/Anchor")
cbind(Side,Current,Projected) %>% reactable(theme = espn()) 

Best/Worst Skill

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