Team: Pepperdine

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

Category <- c("Games", "Minutes")
Value <- c(25,32)
cbind(Category, Value) %>% reactable( theme = espn())

Notes:

Strengths

Weaknesses

Questions

*Like Brandon Miller, he is old for a freshmen.

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.593, 0.550, .330, 0.313, 27.9, .63, .93, 21.6, 0.1, 0.040, 0.140, 3.5, 0.3)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
  gt_highlight_rows( rows = c(10), fill = "red") %>%
  gt_highlight_rows( rows = c(9,2,3,4,5,6,7,8,11,12,13), fill = "orange") %>%
  gt_highlight_rows( rows = c(1), fill = "green")
Stats Values
TS% 0.593
EFG% 0.55
3PA Rate 0.33
FTA Rate 0.313
USG% 27.9
Ast/USG 0.63
Ast/TO 0.93
Per 21.6
OWS/40 0.1
DWS/40 0.04
WS/40 0.14
OBPM 3.5
DBPM 0.3

Draft Value

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

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

Roles

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

Best/Worst Skill

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