Team: Houston

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

Category <- c("Games", "Minutes")
Value <- c(17,29.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.542, 0.502, .536, 0.259, 27.5, 0.67, 2.08, 24.2, 0.151, 0.135, 0.286, 6.6, 6.2)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(4,6), fill = "red") %>%
  gt_highlight_rows( rows = c(1,2,5,7,8,9), fill = "orange") %>%
  gt_highlight_rows(rows = c(3,10,11,12,13), fill = "green")
Stats Values
TS% 0.542
EFG% 0.502
3PA Rate 0.536
FTA Rate 0.259
USG% 27.5
Ast/USG 0.67
Ast/TO 2.08
Per 24.2
OWS/40 0.151
DWS/40 0.135
WS/40 0.286
OBPM 6.6
DBPM 6.2

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Second Round", "Role Player", 28.25)

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

Roles

Side <- c("Offense", "Defense")
Current <- c("Shot Creator", "On Ball Container")
Projected <- c("Spacer", "94 Foot Fighter")
cbind(Side,Current,Projected) %>% reactable(theme = espn()) 

Best/Worst Skill

Skill <- c("Best Skill", "Worst Skill")
Player <- c("Shooting", "Height")
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", "Impactful", "Impactful", "Functional", "Liability", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(6,7,10,11), fill = "green") %>%
  gt_highlight_rows( rows = c(1,2,3,4,5,8,9,12,14), fill = "orange") %>%
  gt_highlight_rows( rows = c(13), 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 Impactful
Change of Pace Impactful
Strength Functional
Vertical Plane Liability
Pliability Functional