Team: UCLA
library(tidyverse)
library(gt)
library(gtExtras)
library(dplyr)
library(reactable)
library(reactablefmtr)
Category <- c("Games", "Minutes")
Value <- c(13,26.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.512, 0.514, .198, 0.171, 21.3, 0.64, 1.11, 13.5, 0.023, 0.106, 0.129, .4, 3.4)
cbind(Stats, Values) %>% as_data_frame() %>% gt() %>%
gt_highlight_rows( rows = c(3,4,8,9,11,12), fill = "red") %>%
gt_highlight_rows( rows = c(1,2,5,6,7,10,13), fill = "orange")
| Stats | Values |
|---|---|
| TS% | 0.512 |
| EFG% | 0.514 |
| 3PA Rate | 0.198 |
| FTA Rate | 0.171 |
| USG% | 21.3 |
| Ast/USG | 0.64 |
| Ast/TO | 1.11 |
| Per | 13.5 |
| OWS/40 | 0.023 |
| DWS/40 | 0.106 |
| WS/40 | 0.129 |
| OBPM | 0.4 |
| DBPM | 3.4 |
Category <- c("Draft Value", "NBA Level in 3 years", "Consensus Mock Draft")
Value <- c("Late Second/Undrafted", "Deep Bench Option", 40)
cbind(Category,Value) %>% reactable(theme = espn(),)
Side <- c("Offense", "Defense")
Current <- c("Secondary Creator", "On Ball Container")
Projected <- c("Shot Creator", "On Ball Container")
cbind(Side,Current,Projected) %>% reactable(theme = espn())
Skill <- c("Best Skill", "Worst Skill")
Player <- c("On Ball Defense", "Understanding Role")
cbind(Skill,Player) %>% reactable(theme = espn())
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", "Liability", "Functional", "Functional", "Functional", "Functional", "Impactful", "Functional", "Functional", "Functional", "Functional", "Functional", "Impactful", "Functional")
cbind(Category, Evaluation) %>% as_data_frame() %>% gt() %>%
gt_highlight_rows( rows = c(7,13), fill = "green") %>%
gt_highlight_rows( rows = c(1,3,4,5,6,8,9,10,11,12,14), fill = "orange") %>%
gt_highlight_rows( rows = 2, fill = "red")
| Category | Evaluation |
|---|---|
| Spacing Awareness | Functional |
| Pattern Recognition | Liability |
| 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 | Impactful |
| Pliability | Functional |
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 gtExtras_0.4.5
## [4] gt_0.8.0 forcats_0.5.2 stringr_1.5.0
## [7] dplyr_1.0.10 purrr_1.0.0 readr_2.1.3
## [10] tidyr_1.2.1 tibble_3.1.8 ggplot2_3.4.0
## [13] 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] fontawesome_0.4.0 rstudioapi_0.14 jquerylib_0.1.4
## [19] rmarkdown_2.19 googledrive_2.0.0 htmlwidgets_1.6.0
## [22] munsell_0.5.0 broom_1.0.2 compiler_4.2.2
## [25] modelr_0.1.10 xfun_0.36 pkgconfig_2.0.3
## [28] htmltools_0.5.4 tidyselect_1.2.0 fansi_1.0.3
## [31] crayon_1.5.2 tzdb_0.3.0 dbplyr_2.2.1
## [34] withr_2.5.0 grid_4.2.2 jsonlite_1.8.4
## [37] gtable_0.3.1 lifecycle_1.0.3 DBI_1.1.3
## [40] magrittr_2.0.3 scales_1.2.1 cli_3.5.0
## [43] stringi_1.7.8 cachem_1.0.6 fs_1.5.2
## [46] xml2_1.3.3 paletteer_1.5.0 bslib_0.4.2
## [49] ellipsis_0.3.2 generics_0.1.3 vctrs_0.5.1
## [52] rematch2_2.1.2 tools_4.2.2 glue_1.6.2
## [55] crosstalk_1.2.0 hms_1.1.2 fastmap_1.1.0
## [58] yaml_2.3.6 timechange_0.1.1 colorspace_2.0-3
## [61] gargle_1.2.1 rvest_1.0.3 knitr_1.41
## [64] haven_2.5.1 sass_0.4.4