Team: University of Kentucky

library(tidyverse)
library(reactable)
library(reactablefmtr)

Category <- c("Games", "Minutes")
Value <- c(8,29.9)
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.571, 0.558, 0, 0.242, 24.3, 0.5, 1, 31.1, 0.134, 0.134, 0.285, 7.8, 5.3)
cbind(Stats, Values) %>% reactable(theme = espn(), pagination = FALSE, highlight = TRUE, columns = list(
  Values = colDef(
    style = cell_style(
      rows = c(1:4),
      font_color = "red"
    )
  )
))

Draft Value

Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Late Second/Undrafted", "Deep Bench Option", 45.75)

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

Roles

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

Best/Worst Skill

Skill <- c("Best Skill", "Worst Skill")
Player <- c("Rebounding", "Stiff")
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("Liability", "Functional", "Liability", "Functional", "Functional", "Functional", "Liability", "Liability", "Functional", "Liability", "Functional", "Impactful", "Functional", "Liability")
cbind(Category, Evaluation) %>% reactable( theme = espn(), pagination = FALSE,
                                           columns = list(
                                           Evaluation = colDef(
                                           style = cell_style(
                                             rows = c(1,3,7,8,10,14),
                                             font_color = "red"
                                           ))))
sessionInfo()
## R version 4.2.2 (2022-10-31)
## Platform: aarch64-apple-darwin20 (64-bit)
## Running under: macOS Ventura 13.0.1
## 
## Matrix products: default
## BLAS:   /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/lib/libRblas.0.dylib
## LAPACK: /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/lib/libRlapack.dylib
## 
## locale:
## [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
##  [1] reactablefmtr_2.0.0 reactable_0.4.1     forcats_0.5.2      
##  [4] stringr_1.5.0       dplyr_1.0.10        purrr_1.0.0        
##  [7] readr_2.1.3         tidyr_1.2.1         tibble_3.1.8       
## [10] ggplot2_3.4.0       tidyverse_1.3.2    
## 
## loaded via a namespace (and not attached):
##  [1] lubridate_1.9.0     assertthat_0.2.1    digest_0.6.31      
##  [4] utf8_1.2.2          reactR_0.4.4        R6_2.5.1           
##  [7] cellranger_1.1.0    backports_1.4.1     reprex_2.0.2       
## [10] evaluate_0.19       httr_1.4.4          pillar_1.8.1       
## [13] rlang_1.0.6         googlesheets4_1.0.1 readxl_1.4.1       
## [16] rstudioapi_0.14     jquerylib_0.1.4     rmarkdown_2.19     
## [19] googledrive_2.0.0   htmlwidgets_1.6.0   munsell_0.5.0      
## [22] broom_1.0.2         compiler_4.2.2      modelr_0.1.10      
## [25] xfun_0.36           pkgconfig_2.0.3     htmltools_0.5.4    
## [28] tidyselect_1.2.0    fansi_1.0.3         crayon_1.5.2       
## [31] tzdb_0.3.0          dbplyr_2.2.1        withr_2.5.0        
## [34] grid_4.2.2          jsonlite_1.8.4      gtable_0.3.1       
## [37] lifecycle_1.0.3     DBI_1.1.3           magrittr_2.0.3     
## [40] scales_1.2.1        cli_3.5.0           stringi_1.7.8      
## [43] cachem_1.0.6        fs_1.5.2            xml2_1.3.3         
## [46] bslib_0.4.2         ellipsis_0.3.2      generics_0.1.3     
## [49] vctrs_0.5.1         tools_4.2.2         glue_1.6.2         
## [52] crosstalk_1.2.0     hms_1.1.2           fastmap_1.1.0      
## [55] yaml_2.3.6          timechange_0.1.1    colorspace_2.0-3   
## [58] gargle_1.2.1        rvest_1.0.3         knitr_1.41         
## [61] haven_2.5.1         sass_0.4.4