Team: Texas

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

Category <- c("Games", "Minutes")
Value <- c(20,21.3)
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.604, 0.617, .000, 0.287, 13.7, 0.23, .67, 17.3, 0.085, 0.085, 0.169, 3.4, 1.9)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(3), fill = "red") %>%
  gt_highlight_rows( rows = c(4,5,6,7,8,9,10,11,12,13), fill = "orange") %>%
  gt_highlight_rows( rows = c(1,2), fill = "green")
Stats Values
TS% 0.604
EFG% 0.617
3PA Rate 0
FTA Rate 0.287
USG% 13.7
Ast/USG 0.23
Ast/TO 0.67
Per 17.3
OWS/40 0.085
DWS/40 0.085
WS/40 0.169
OBPM 3.4
DBPM 1.9

Draft Value

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

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

*Mitchell started high on draft boards coming into the season but has fallen down them lately.

Roles

Side <- c("Offense", "Defense")
Current <- c("Right Place", "On Ball Container")
Projected <- c("Spacer", "On Ball Container")
cbind(Side,Current,Projected) %>% reactable(theme = espn()) 

Best/Worst Skill

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