Team: Arkansas

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

Category <- c("Games", "Minutes")
Value <- c(23,35.1)
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.549, 0.495, .306, 0.568, 20.4, 1, 1.33, 16.6, 0.059, 0.084, 0.144, 2.5, 3.6)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(), fill = "red") %>%
  gt_highlight_rows( rows = c(1,2,3,5,6,7,8,9,11,12), fill = "orange") %>%
  gt_highlight_rows( rows = c(4,10,13), fill = "green")
Stats Values
TS% 0.549
EFG% 0.495
3PA Rate 0.306
FTA Rate 0.568
USG% 20.4
Ast/USG 1
Ast/TO 1.33
Per 16.6
OWS/40 0.059
DWS/40 0.084
WS/40 0.144
OBPM 2.5
DBPM 3.6

Draft Value

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

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

Roles

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

Best/Worst Skill

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