The following are tables of comparable draft combine participants to Nuggets 2022-2023 rookies providing some potential developmental way points and warnings. It is no way a prediction or projection but meant to frame the realistic roles the player could most likely fill given their physical measurements.

Offensive and defensive roles are projections based off of players in the comparison tables.

R Packages

library(nbastatR)
library(tidyverse)
library(dplyr)
library(ggplot2)
library(reactable)
library(rvest)
library(reactablefmtr)
#importing draft combine data
draft_data <- draft_combines( years = 2012:2023)
## Acquiring 2012 NBA Draft Combine Data
## Acquiring 2013 NBA Draft Combine Data
## Acquiring 2014 NBA Draft Combine Data
## Acquiring 2015 NBA Draft Combine Data
## Acquiring 2016 NBA Draft Combine Data
## Acquiring 2017 NBA Draft Combine Data
## Acquiring 2018 NBA Draft Combine Data
## Acquiring 2019 NBA Draft Combine Data
## Acquiring 2020 NBA Draft Combine Data
## Acquiring 2021 NBA Draft Combine Data
## Acquiring 2022 NBA Draft Combine Data
## Acquiring 2023 NBA Draft Combine Data

Christian Braun

braun <- draft_data %>%
  filter(namePlayer == "Christian Braun") %>%
  select(namePlayer,
         heightWShoesInches,
         weightLBS,
         wingspanInches,
         pctBodyFat,
         verticalLeapMaxInches,
         timeModifiedLaneAgility,
         timeThreeQuarterCourtSprint) %>%
  t()
braun_comps <- draft_data %>%
  filter( heightWShoesInches > 75) %>%
  filter(heightWShoesInches < 83) %>%
  filter(weightLBS > 205) %>%
  filter(weightLBS < 213) %>%
  filter(wingspanInches > 74) %>%
  filter(wingspanInches < 83) %>%
  filter(verticalLeapMaxInches > 36) %>%
  filter(verticalLeapMaxInches < 44) %>%
  filter(timeModifiedLaneAgility < 6) %>%
  filter(timeThreeQuarterCourtSprint < 6) %>%
  select(namePlayer,
         heightWShoesInches,
         weightLBS,
         wingspanInches,
         pctBodyFat,
         verticalLeapMaxInches,
         timeModifiedLaneAgility,
         timeThreeQuarterCourtSprint) %>%
  reactable( pagination = FALSE,
             filterable = TRUE,
             searchable = TRUE,
             sortable = TRUE) %>%
  add_title("Draft Combine Comps for Christian Braun")
braun %>% reactable()
braun_comps

Draft Combine Comps for Christian Braun

Offensive Role: Spacer Defensive Role: Switchable- Solid

Peyton Watson

watson <- draft_data %>%
  filter(namePlayer == "Peyton Watson") %>%
  select(namePlayer,
         heightWShoesInches,
         weightLBS,
         wingspanInches,
         pctBodyFat,
         verticalLeapMaxInches,
         timeModifiedLaneAgility,
         timeThreeQuarterCourtSprint) %>%
  t()
watson_comps <- draft_data %>%
  filter( heightWShoesInches > 76) %>%
  filter(heightWShoesInches < 84) %>%
  filter(weightLBS > 199) %>%
  filter(weightLBS < 207) %>%
  filter(wingspanInches > 80) %>%
  filter(wingspanInches < 88) %>%
  filter(verticalLeapMaxInches > 29) %>%
  filter(verticalLeapMaxInches < 37) %>%
  filter(timeModifiedLaneAgility < 6) %>%
  filter(timeThreeQuarterCourtSprint < 6) %>%
  select(namePlayer,
         heightWShoesInches,
         weightLBS,
         wingspanInches,
         pctBodyFat,
         verticalLeapMaxInches,
         timeModifiedLaneAgility,
         timeThreeQuarterCourtSprint) %>%
  reactable( pagination = FALSE,
             filterable = TRUE,
             searchable = TRUE,
             sortable = TRUE) %>%
  add_title("Draft Combine Comps for Peyton Watson")
watson %>% reactable()
watson_comps

Draft Combine Comps for Peyton Watson

Offensive Role: Spacer Defensive Role: Switchable- disruptive

Ismael Kamagate

measurements <- c("namePlayer",
         "heightWShoesInches",
         "weightLBS",
         "wingspanInches")
values <- c("Ismael Kamagate",
            83,
            230,
            87)
kamagate <- rbind( measurements, values) %>% t()

kamagate_comps <- draft_data %>%
  filter( heightWShoesInches > 79) %>%
  filter(heightWShoesInches < 87) %>%
  filter(weightLBS > 226) %>%
  filter(weightLBS < 234) %>%
  filter(wingspanInches > 83) %>%
  filter(wingspanInches < 91) %>% 
  select(namePlayer,
         heightWShoesInches,
         weightLBS,
         wingspanInches,
         pctBodyFat,
         verticalLeapMaxInches,
         timeModifiedLaneAgility,
         timeThreeQuarterCourtSprint) %>%
  reactable( pagination = FALSE,
             filterable = TRUE,
             searchable = TRUE,
             sortable = TRUE) %>%
  add_title("Draft Combine Comps for Ismael Kamagate")
kamagate %>% reactable()
kamagate_comps

Draft Combine Comps for Ismael Kamagate

Offensive Role: Rim Runner Defensive Role: Rim Protector

Collin Gillespie

gillespie <- draft_data %>%
  filter(namePlayer == "Collin Gillespie") %>%
  select(namePlayer,
         heightWShoesInches,
         weightLBS,
         wingspanInches,
         pctBodyFat,
         verticalLeapMaxInches,
         timeModifiedLaneAgility,
         timeThreeQuarterCourtSprint) %>%
  t()
gillespie_comps <- draft_data %>%
  filter( heightWShoesInches > 71) %>%
  filter(heightWShoesInches < 79) %>%
  filter(weightLBS > 195) %>%
  filter(weightLBS < 203) %>%
  filter(wingspanInches > 72) %>%
  filter(wingspanInches < 80) %>%
  filter(verticalLeapMaxInches > 29) %>%
  filter(verticalLeapMaxInches < 37) %>%
  filter(timeModifiedLaneAgility < 6) %>%
  filter(timeThreeQuarterCourtSprint < 6) %>%
  select(namePlayer,
         heightWShoesInches,
         weightLBS,
         wingspanInches,
         pctBodyFat,
         verticalLeapMaxInches,
         timeModifiedLaneAgility,
         timeThreeQuarterCourtSprint) %>%
  reactable( pagination = FALSE,
             filterable = TRUE,
             searchable = TRUE,
             sortable = TRUE) %>% 
  add_title("Draft Combine Comps for Collin Gillespie")
gillespie %>% reactable()
gillespie_comps

Draft Combine Comps for Collin Gillespie

Offensive Role: Connector/Spacer Defensive Role: 94 feet

sessionInfo()
## R version 4.1.0 (2021-05-18)
## Platform: x86_64-apple-darwin17.0 (64-bit)
## Running under: macOS Big Sur 10.16
## 
## Matrix products: default
## BLAS:   /Library/Frameworks/R.framework/Versions/4.1/Resources/lib/libRblas.dylib
## LAPACK: /Library/Frameworks/R.framework/Versions/4.1/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 rvest_1.0.2         reactable_0.3.0    
##  [4] forcats_0.5.1       stringr_1.4.0       dplyr_1.0.7        
##  [7] purrr_0.3.4         readr_2.0.1         tidyr_1.2.0        
## [10] tibble_3.1.4        ggplot2_3.3.5       tidyverse_1.3.1    
## [13] nbastatR_0.1.1506  
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.7        lubridate_1.7.10  listenv_0.8.0     assertthat_0.2.1 
##  [5] digest_0.6.27     utf8_1.2.2        parallelly_1.28.1 reactR_0.4.4     
##  [9] R6_2.5.1          cellranger_1.1.0  backports_1.2.1   reprex_2.0.0     
## [13] evaluate_0.14     httr_1.4.2        pillar_1.6.2      rlang_0.4.11     
## [17] curl_4.3.2        readxl_1.3.1      rstudioapi_0.13   furrr_0.2.3      
## [21] jquerylib_0.1.4   rmarkdown_2.14    htmlwidgets_1.5.4 munsell_0.5.0    
## [25] broom_0.7.8       compiler_4.1.0    modelr_0.1.8      xfun_0.31        
## [29] pkgconfig_2.0.3   globals_0.14.0    htmltools_0.5.2   tidyselect_1.1.1 
## [33] codetools_0.2-18  fansi_0.5.0       future_1.22.1     withr_2.4.2      
## [37] crayon_1.4.1      tzdb_0.1.2        dbplyr_2.1.1      grid_4.1.0       
## [41] jsonlite_1.7.2    gtable_0.3.0      lifecycle_1.0.0   DBI_1.1.1        
## [45] magrittr_2.0.1    scales_1.1.1      cli_3.0.1         stringi_1.7.4    
## [49] cachem_1.0.6      fs_1.5.0          xml2_1.3.2        bslib_0.3.1      
## [53] ellipsis_0.3.2    generics_0.1.0    vctrs_0.3.8       tools_4.1.0      
## [57] glue_1.4.2        crosstalk_1.2.0   hms_1.1.0         parallel_4.1.0   
## [61] fastmap_1.1.0     yaml_2.2.1        colorspace_2.0-2  memoise_2.0.0    
## [65] knitr_1.33        haven_2.4.1       sass_0.4.0