Team: Duke

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

Category <- c("Games", "Minutes")
Value <- c(19,16.4)
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.578, 0.579, .095, 0.238, 13.8, 0.70, 1, 20.3, 0.064, 0.103, 0.179, .4, 6.5)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(4), fill = "red") %>%
  gt_highlight_rows( rows = c(1,2,3,5,6,7,8,9,11,12), fill = "orange") %>%
  gt_highlight_rows( rows = c(10,13), fill = "green")
Stats Values
TS% 0.578
EFG% 0.579
3PA Rate 0.095
FTA Rate 0.238
USG% 13.8
Ast/USG 0.7
Ast/TO 1
Per 20.3
OWS/40 0.064
DWS/40 0.103
WS/40 0.179
OBPM 0.4
DBPM 6.5

Draft Value

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

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

Roles

Side <- c("Offense", "Defense")
Current <- c("Rim Runner", "Anchor")
Projected <- c("Rim Runner", "Anchor")
cbind(Side,Current,Projected) %>% reactable(theme = espn()) 

Best/Worst Skill

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