Team: Arkansas

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

Category <- c("Games", "Minutes")
Value <- c(23,24.2)
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.525, 0.500, .352, 0.254, 16.5, .45, .88, 13, 0.043, 0.086, 0.129, .2, 3.3)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(), fill = "red") %>%
  gt_highlight_rows( rows = c(1,2,3,4,5,6,7,8,9,11,12), fill = "orange") %>%
  gt_highlight_rows( rows = c(10,13), fill = "green")
Stats Values
TS% 0.525
EFG% 0.5
3PA Rate 0.352
FTA Rate 0.254
USG% 16.5
Ast/USG 0.45
Ast/TO 0.88
Per 13
OWS/40 0.043
DWS/40 0.086
WS/40 0.129
OBPM 0.2
DBPM 3.3

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Late First", "Sporatic Role Player", 43)

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

Roles

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

Best/Worst Skill

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