tidymodels / discrim

Wrappers for discriminant analysis and naive Bayes models for use with the parsnip package
https://discrim.tidymodels.org
Other
28 stars 3 forks source link

discrim_regularized tune error #19

Closed royfrancis closed 3 years ago

royfrancis commented 3 years ago
library(tidymodels)
#> ── Attaching packages ────────────────────────────────────── tidymodels 0.1.2 ──
#> ✓ broom     0.7.3      ✓ recipes   0.1.15
#> ✓ dials     0.0.9      ✓ rsample   0.0.8 
#> ✓ dplyr     1.0.2      ✓ tibble    3.0.4 
#> ✓ ggplot2   3.3.2      ✓ tidyr     1.1.2 
#> ✓ infer     0.5.3      ✓ tune      0.1.2 
#> ✓ modeldata 0.1.0      ✓ workflows 0.2.1 
#> ✓ parsnip   0.1.4      ✓ yardstick 0.0.7 
#> ✓ purrr     0.3.4
#> ── Conflicts ───────────────────────────────────────── tidymodels_conflicts() ──
#> x purrr::discard() masks scales::discard()
#> x dplyr::filter()  masks stats::filter()
#> x dplyr::lag()     masks stats::lag()
#> x recipes::step()  masks stats::step()
library(discrim)
#> 
#> Attaching package: 'discrim'
#> The following object is masked from 'package:dials':
#> 
#>     smoothness

set.seed(777)
df_split <- initial_split(iris,prob=0.80,strata=Species)
df_train <- training(df_split)

recipe_rda <- df_train %>%
  recipe(Species ~ .) %>%
  step_zv(all_predictors()) %>%
  step_corr(all_predictors())

spec_rda <- discrim_regularized(frac_common_cov = tune(), frac_identity = tune()) %>% 
  set_mode("classification") %>% 
  set_engine("klaR") 

wf_rda <- workflow() %>%
  add_recipe(recipe_rda) %>%
  add_model(spec_rda)

grid_rda <- grid_regular(frac_common_cov(),frac_identity(),levels=5)
#> Error: Element `id` should have unique values. Duplicates exist for item(s): 'threshold'

Created on 2021-01-04 by the reprex package (v0.3.0)

Session info ``` r devtools::session_info() #> ─ Session info ─────────────────────────────────────────────────────────────── #> setting value #> version R version 4.0.0 (2020-04-24) #> os Ubuntu 20.04.1 LTS #> system x86_64, linux-gnu #> ui X11 #> language en_GB:en #> collate en_GB.UTF-8 #> ctype en_GB.UTF-8 #> tz Europe/Stockholm #> date 2021-01-04 #> #> ─ Packages ─────────────────────────────────────────────────────────────────── #> package * version date lib source #> assertthat 0.2.1 2019-03-21 [1] CRAN (R 4.0.0) #> backports 1.2.1 2020-12-09 [1] CRAN (R 4.0.0) #> broom * 0.7.3 2020-12-16 [1] CRAN (R 4.0.0) #> callr 3.5.1 2020-10-13 [1] CRAN (R 4.0.0) #> class 7.3-16 2020-03-25 [2] CRAN (R 4.0.0) #> cli 2.2.0 2020-11-20 [1] CRAN (R 4.0.0) #> codetools 0.2-16 2018-12-24 [2] CRAN (R 4.0.0) #> colorspace 2.0-0 2020-11-11 [1] CRAN (R 4.0.0) #> crayon 1.3.4 2017-09-16 [1] CRAN (R 4.0.0) #> desc 1.2.0 2018-05-01 [1] CRAN (R 4.0.0) #> devtools 2.3.2 2020-09-18 [1] CRAN (R 4.0.0) #> dials * 0.0.9 2020-09-16 [1] CRAN (R 4.0.0) #> DiceDesign 1.8-1 2019-07-31 [1] CRAN (R 4.0.0) #> digest 0.6.27 2020-10-24 [1] CRAN (R 4.0.0) #> discrim * 0.1.1 2020-10-28 [1] CRAN (R 4.0.0) #> dplyr * 1.0.2 2020-08-18 [1] CRAN (R 4.0.0) #> ellipsis 0.3.1 2020-05-15 [1] CRAN (R 4.0.0) #> evaluate 0.14 2019-05-28 [1] CRAN (R 4.0.0) #> fansi 0.4.1 2020-01-08 [1] CRAN (R 4.0.0) #> foreach 1.5.1 2020-10-15 [1] CRAN (R 4.0.0) #> fs 1.5.0 2020-07-31 [1] CRAN (R 4.0.0) #> furrr 0.2.1 2020-10-21 [1] CRAN (R 4.0.0) #> future 1.21.0 2020-12-10 [1] CRAN (R 4.0.0) #> generics 0.1.0 2020-10-31 [1] CRAN (R 4.0.0) #> ggplot2 * 3.3.2 2020-06-19 [1] CRAN (R 4.0.0) #> globals 0.14.0 2020-11-22 [1] CRAN (R 4.0.0) #> glue 1.4.2 2020-08-27 [1] CRAN (R 4.0.0) #> gower 0.2.2 2020-06-23 [1] CRAN (R 4.0.0) #> GPfit 1.0-8 2019-02-08 [1] CRAN (R 4.0.0) #> gtable 0.3.0 2019-03-25 [1] CRAN (R 4.0.0) #> highr 0.8 2019-03-20 [1] CRAN (R 4.0.0) #> htmltools 0.5.0 2020-06-16 [1] CRAN (R 4.0.0) #> infer * 0.5.3 2020-07-14 [1] CRAN (R 4.0.0) #> ipred 0.9-9 2019-04-28 [1] CRAN (R 4.0.0) #> iterators 1.0.13 2020-10-15 [1] CRAN (R 4.0.0) #> knitr 1.30 2020-09-22 [1] CRAN (R 4.0.0) #> lattice 0.20-41 2020-04-02 [2] CRAN (R 4.0.0) #> lava 1.6.8.1 2020-11-04 [1] CRAN (R 4.0.0) #> lhs 1.1.1 2020-10-05 [1] CRAN (R 4.0.0) #> lifecycle 0.2.0 2020-03-06 [1] CRAN (R 4.0.0) #> listenv 0.8.0 2019-12-05 [1] CRAN (R 4.0.0) #> lubridate 1.7.9.2 2020-11-13 [1] CRAN (R 4.0.0) #> magrittr 2.0.1 2020-11-17 [1] CRAN (R 4.0.0) #> MASS 7.3-53 2020-09-09 [1] CRAN (R 4.0.0) #> Matrix 1.2-18 2019-11-27 [2] CRAN (R 4.0.0) #> memoise 1.1.0 2017-04-21 [1] CRAN (R 4.0.0) #> modeldata * 0.1.0 2020-10-22 [1] CRAN (R 4.0.0) #> munsell 0.5.0 2018-06-12 [1] CRAN (R 4.0.0) #> nnet 7.3-13 2020-02-25 [2] CRAN (R 4.0.0) #> parallelly 1.22.0 2020-12-13 [1] CRAN (R 4.0.0) #> parsnip * 0.1.4 2020-10-27 [1] CRAN (R 4.0.0) #> pillar 1.4.7 2020-11-20 [1] CRAN (R 4.0.0) #> pkgbuild 1.2.0 2020-12-15 [1] CRAN (R 4.0.0) #> pkgconfig 2.0.3 2019-09-22 [1] CRAN (R 4.0.0) #> pkgload 1.1.0 2020-05-29 [1] CRAN (R 4.0.0) #> plyr 1.8.6 2020-03-03 [1] CRAN (R 4.0.0) #> prettyunits 1.1.1 2020-01-24 [1] CRAN (R 4.0.0) #> pROC 1.16.2 2020-03-19 [1] CRAN (R 4.0.0) #> processx 3.4.5 2020-11-30 [1] CRAN (R 4.0.0) #> prodlim 2019.11.13 2019-11-17 [1] CRAN (R 4.0.0) #> ps 1.5.0 2020-12-05 [1] CRAN (R 4.0.0) #> purrr * 0.3.4 2020-04-17 [1] CRAN (R 4.0.0) #> R6 2.5.0 2020-10-28 [1] CRAN (R 4.0.0) #> Rcpp 1.0.5 2020-07-06 [1] CRAN (R 4.0.0) #> recipes * 0.1.15 2020-11-11 [1] CRAN (R 4.0.0) #> remotes 2.2.0 2020-07-21 [1] CRAN (R 4.0.0) #> rlang 0.4.9 2020-11-26 [1] CRAN (R 4.0.0) #> rmarkdown 2.6 2020-12-14 [1] CRAN (R 4.0.0) #> rpart 4.1-15 2019-04-12 [2] CRAN (R 4.0.0) #> rprojroot 2.0.2 2020-11-15 [1] CRAN (R 4.0.0) #> rsample * 0.0.8 2020-09-23 [1] CRAN (R 4.0.0) #> rstudioapi 0.13 2020-11-12 [1] CRAN (R 4.0.0) #> scales * 1.1.1 2020-05-11 [1] CRAN (R 4.0.0) #> sessioninfo 1.1.1 2018-11-05 [1] CRAN (R 4.0.0) #> stringi 1.5.3 2020-09-09 [1] CRAN (R 4.0.0) #> stringr 1.4.0 2019-02-10 [1] CRAN (R 4.0.0) #> survival 3.1-12 2020-04-10 [2] CRAN (R 4.0.0) #> testthat 3.0.1 2020-12-17 [1] CRAN (R 4.0.0) #> tibble * 3.0.4 2020-10-12 [1] CRAN (R 4.0.0) #> tidymodels * 0.1.2 2020-11-22 [1] CRAN (R 4.0.0) #> tidyr * 1.1.2 2020-08-27 [1] CRAN (R 4.0.0) #> tidyselect 1.1.0 2020-05-11 [1] CRAN (R 4.0.0) #> timeDate 3043.102 2018-02-21 [1] CRAN (R 4.0.0) #> tune * 0.1.2 2020-11-17 [1] CRAN (R 4.0.0) #> usethis 2.0.0 2020-12-10 [1] CRAN (R 4.0.0) #> vctrs 0.3.6 2020-12-17 [1] CRAN (R 4.0.0) #> withr 2.3.0 2020-09-22 [1] CRAN (R 4.0.0) #> workflows * 0.2.1 2020-10-08 [1] CRAN (R 4.0.0) #> xfun 0.19 2020-10-30 [1] CRAN (R 4.0.0) #> yaml 2.2.1 2020-02-01 [1] CRAN (R 4.0.0) #> yardstick * 0.0.7 2020-07-13 [1] CRAN (R 4.0.0) #> #> [1] /home/roy/R/x86_64-pc-linux-gnu-library/4.0.0 #> [2] /usr/local/R/4.0.0/lib/R/library ```
royfrancis commented 3 years ago

So, it seems like both frac_common_cov() and frac_identity() creates columns with the same name threshold. Perhaps, they shouldn't be used together?

And if I decide to tune only 1 parameter, then I get another error further down when tuning.

spec_rda <- discrim_regularized(frac_common_cov = tune()) %>% 
  set_mode("classification") %>% 
  set_engine("klaR") 

wf_rda <- workflow() %>%
  add_recipe(recipe_rda) %>%
  add_model(spec_rda)

grid_rda <- grid_regular(frac_common_cov(),levels=5)

tune_rda <- tune_grid(wf_rda, resamples=df_train_cv, grid=grid_rda)

Error: The provided `grid` has the following parameter columns that have not been marked for tuning by `tune()`: 'threshold'.
Run `rlang::last_error()` to see where the error occurred.
topepo commented 3 years ago

That's a bug in those parameter definitions. For example:

frac_common_cov <- function(range = c(0, 1), trans = NULL) {
  dials::new_quant_param(
    type = "double",
    range = range,
    inclusive = c(TRUE, TRUE),
    trans = trans,
    default = 0.5,
    label = c(threshold = "Fraction of the Common Covariance Matrix"), # <- should not be named threshold
    finalize = NULL
  )
}

In the meantime, this should work (giving them IDs):

library(tidymodels)
library(discrim)

set.seed(777)
df_split <- initial_split(iris,prob=0.80,strata=Species)
df_train <- training(df_split)

recipe_rda <- df_train %>%
   recipe(Species ~ .) %>%
   step_zv(all_predictors()) %>%
   step_corr(all_predictors())

spec_rda <-
   discrim_regularized(frac_common_cov = tune("covar"),
                       frac_identity = tune("ident")) %>%
   set_mode("classification") %>%
   set_engine("klaR")

wf_rda <- workflow() %>%
   add_recipe(recipe_rda) %>%
   add_model(spec_rda)

grid_rda <-
   grid_regular(list(covar = frac_common_cov(), ident = frac_identity()), 
                levels = 5)
grid_rda
royfrancis commented 3 years ago

The tuning still seems to be failing.

library(tidymodels)
#> ── Attaching packages ────────────────────────────────────── tidymodels 0.1.2 ──
#> ✓ broom     0.7.3      ✓ recipes   0.1.15
#> ✓ dials     0.0.9      ✓ rsample   0.0.8 
#> ✓ dplyr     1.0.2      ✓ tibble    3.0.4 
#> ✓ ggplot2   3.3.2      ✓ tidyr     1.1.2 
#> ✓ infer     0.5.3      ✓ tune      0.1.2 
#> ✓ modeldata 0.1.0      ✓ workflows 0.2.1 
#> ✓ parsnip   0.1.4      ✓ yardstick 0.0.7 
#> ✓ purrr     0.3.4
#> ── Conflicts ───────────────────────────────────────── tidymodels_conflicts() ──
#> x purrr::discard() masks scales::discard()
#> x dplyr::filter()  masks stats::filter()
#> x dplyr::lag()     masks stats::lag()
#> x recipes::step()  masks stats::step()
library(discrim)
#> 
#> Attaching package: 'discrim'
#> The following object is masked from 'package:dials':
#> 
#>     smoothness

set.seed(777)
df_split <- initial_split(iris,prob=0.80,strata=Species)
df_train <- training(df_split)
df_train_cv <- vfold_cv(df_train,v=6,repeats=3,strata=Species)

recipe_rda <- df_train %>%
  recipe(Species ~ .) %>%
  step_zv(all_predictors()) %>%
  step_corr(all_predictors())

spec_rda <-
  discrim_regularized(frac_common_cov = tune("covar"),
                      frac_identity = tune("ident")) %>%
  set_mode("classification") %>%
  set_engine("klaR")

wf_rda <- workflow() %>%
  add_recipe(recipe_rda) %>%
  add_model(spec_rda)

grid_rda <-
  grid_regular(list(covar = frac_common_cov(), ident = frac_identity()), 
               levels = 5)

tune_rda <- tune_grid(wf_rda, resamples=df_train_cv, grid=grid_rda)
#> 
#> Attaching package: 'rlang'
#> The following objects are masked from 'package:purrr':
#> 
#>     %@%, as_function, flatten, flatten_chr, flatten_dbl, flatten_int,
#>     flatten_lgl, flatten_raw, invoke, list_along, modify, prepend,
#>     splice
#> 
#> Attaching package: 'vctrs'
#> The following object is masked from 'package:tibble':
#> 
#>     data_frame
#> The following object is masked from 'package:dplyr':
#> 
#>     data_frame
#> Loading required package: MASS
#> 
#> Attaching package: 'MASS'
#> The following object is masked from 'package:dplyr':
#> 
#>     select
#> Error: Assigned data `notes` must be compatible with existing data.
#> x Existing data has 90 rows.
#> x Assigned data has 18 rows.
#> ℹ Only vectors of size 1 are recycled.

Created on 2021-01-05 by the reprex package (v0.3.0)

Session info ``` r devtools::session_info() #> ─ Session info ─────────────────────────────────────────────────────────────── #> setting value #> version R version 4.0.0 (2020-04-24) #> os Ubuntu 20.04.1 LTS #> system x86_64, linux-gnu #> ui X11 #> language en_GB:en #> collate en_GB.UTF-8 #> ctype en_GB.UTF-8 #> tz Europe/Stockholm #> date 2021-01-05 #> #> ─ Packages ─────────────────────────────────────────────────────────────────── #> package * version date lib source #> assertthat 0.2.1 2019-03-21 [1] CRAN (R 4.0.0) #> backports 1.2.1 2020-12-09 [1] CRAN (R 4.0.0) #> broom * 0.7.3 2020-12-16 [1] CRAN (R 4.0.0) #> callr 3.5.1 2020-10-13 [1] CRAN (R 4.0.0) #> class 7.3-16 2020-03-25 [2] CRAN (R 4.0.0) #> cli 2.2.0 2020-11-20 [1] CRAN (R 4.0.0) #> codetools 0.2-16 2018-12-24 [2] CRAN (R 4.0.0) #> colorspace 2.0-0 2020-11-11 [1] CRAN (R 4.0.0) #> combinat 0.0-8 2012-10-29 [1] CRAN (R 4.0.0) #> crayon 1.3.4 2017-09-16 [1] CRAN (R 4.0.0) #> desc 1.2.0 2018-05-01 [1] CRAN (R 4.0.0) #> devtools 2.3.2 2020-09-18 [1] CRAN (R 4.0.0) #> dials * 0.0.9 2020-09-16 [1] CRAN (R 4.0.0) #> DiceDesign 1.8-1 2019-07-31 [1] CRAN (R 4.0.0) #> digest 0.6.27 2020-10-24 [1] CRAN (R 4.0.0) #> discrim * 0.1.1 2020-10-28 [1] CRAN (R 4.0.0) #> dplyr * 1.0.2 2020-08-18 [1] CRAN (R 4.0.0) #> ellipsis 0.3.1 2020-05-15 [1] CRAN (R 4.0.0) #> evaluate 0.14 2019-05-28 [1] CRAN (R 4.0.0) #> fansi 0.4.1 2020-01-08 [1] CRAN (R 4.0.0) #> fastmap 1.0.1 2019-10-08 [1] CRAN (R 4.0.0) #> forcats 0.5.0 2020-03-01 [1] CRAN (R 4.0.0) #> foreach 1.5.1 2020-10-15 [1] CRAN (R 4.0.0) #> fs 1.5.0 2020-07-31 [1] CRAN (R 4.0.0) #> furrr 0.2.1 2020-10-21 [1] CRAN (R 4.0.0) #> future 1.21.0 2020-12-10 [1] CRAN (R 4.0.0) #> generics 0.1.0 2020-10-31 [1] CRAN (R 4.0.0) #> ggplot2 * 3.3.2 2020-06-19 [1] CRAN (R 4.0.0) #> globals 0.14.0 2020-11-22 [1] CRAN (R 4.0.0) #> glue 1.4.2 2020-08-27 [1] CRAN (R 4.0.0) #> gower 0.2.2 2020-06-23 [1] CRAN (R 4.0.0) #> GPfit 1.0-8 2019-02-08 [1] CRAN (R 4.0.0) #> gtable 0.3.0 2019-03-25 [1] CRAN (R 4.0.0) #> hardhat 0.1.5 2020-11-09 [1] CRAN (R 4.0.0) #> haven 2.3.1 2020-06-01 [1] CRAN (R 4.0.0) #> highr 0.8 2019-03-20 [1] CRAN (R 4.0.0) #> hms 0.5.3 2020-01-08 [1] CRAN (R 4.0.0) #> htmltools 0.5.0 2020-06-16 [1] CRAN (R 4.0.0) #> httpuv 1.5.4 2020-06-06 [1] CRAN (R 4.0.0) #> infer * 0.5.3 2020-07-14 [1] CRAN (R 4.0.0) #> ipred 0.9-9 2019-04-28 [1] CRAN (R 4.0.0) #> iterators 1.0.13 2020-10-15 [1] CRAN (R 4.0.0) #> klaR * 0.6-15 2020-02-19 [1] CRAN (R 4.0.0) #> knitr 1.30 2020-09-22 [1] CRAN (R 4.0.0) #> labelled 2.7.0 2020-09-21 [1] CRAN (R 4.0.0) #> later 1.1.0.1 2020-06-05 [1] CRAN (R 4.0.0) #> lattice 0.20-41 2020-04-02 [2] CRAN (R 4.0.0) #> lava 1.6.8.1 2020-11-04 [1] CRAN (R 4.0.0) #> lhs 1.1.1 2020-10-05 [1] CRAN (R 4.0.0) #> lifecycle 0.2.0 2020-03-06 [1] CRAN (R 4.0.0) #> listenv 0.8.0 2019-12-05 [1] CRAN (R 4.0.0) #> lubridate 1.7.9.2 2020-11-13 [1] CRAN (R 4.0.0) #> magrittr 2.0.1 2020-11-17 [1] CRAN (R 4.0.0) #> MASS * 7.3-53 2020-09-09 [1] CRAN (R 4.0.0) #> Matrix 1.2-18 2019-11-27 [2] CRAN (R 4.0.0) #> memoise 1.1.0 2017-04-21 [1] CRAN (R 4.0.0) #> mime 0.9 2020-02-04 [1] CRAN (R 4.0.0) #> miniUI 0.1.1.1 2018-05-18 [1] CRAN (R 4.0.0) #> modeldata * 0.1.0 2020-10-22 [1] CRAN (R 4.0.0) #> munsell 0.5.0 2018-06-12 [1] CRAN (R 4.0.0) #> nnet 7.3-13 2020-02-25 [2] CRAN (R 4.0.0) #> parallelly 1.22.0 2020-12-13 [1] CRAN (R 4.0.0) #> parsnip * 0.1.4 2020-10-27 [1] CRAN (R 4.0.0) #> pillar 1.4.7 2020-11-20 [1] CRAN (R 4.0.0) #> pkgbuild 1.2.0 2020-12-15 [1] CRAN (R 4.0.0) #> pkgconfig 2.0.3 2019-09-22 [1] CRAN (R 4.0.0) #> pkgload 1.1.0 2020-05-29 [1] CRAN (R 4.0.0) #> plyr 1.8.6 2020-03-03 [1] CRAN (R 4.0.0) #> prettyunits 1.1.1 2020-01-24 [1] CRAN (R 4.0.0) #> pROC 1.16.2 2020-03-19 [1] CRAN (R 4.0.0) #> processx 3.4.5 2020-11-30 [1] CRAN (R 4.0.0) #> prodlim 2019.11.13 2019-11-17 [1] CRAN (R 4.0.0) #> promises 1.1.1 2020-06-09 [1] CRAN (R 4.0.0) #> ps 1.5.0 2020-12-05 [1] CRAN (R 4.0.0) #> purrr * 0.3.4 2020-04-17 [1] CRAN (R 4.0.0) #> questionr 0.7.4 2020-11-30 [1] CRAN (R 4.0.0) #> R6 2.5.0 2020-10-28 [1] CRAN (R 4.0.0) #> Rcpp 1.0.5 2020-07-06 [1] CRAN (R 4.0.0) #> recipes * 0.1.15 2020-11-11 [1] CRAN (R 4.0.0) #> remotes 2.2.0 2020-07-21 [1] CRAN (R 4.0.0) #> rlang * 0.4.9 2020-11-26 [1] CRAN (R 4.0.0) #> rmarkdown 2.6 2020-12-14 [1] CRAN (R 4.0.0) #> rpart 4.1-15 2019-04-12 [2] CRAN (R 4.0.0) #> rprojroot 2.0.2 2020-11-15 [1] CRAN (R 4.0.0) #> rsample * 0.0.8 2020-09-23 [1] CRAN (R 4.0.0) #> rstudioapi 0.13 2020-11-12 [1] CRAN (R 4.0.0) #> scales * 1.1.1 2020-05-11 [1] CRAN (R 4.0.0) #> sessioninfo 1.1.1 2018-11-05 [1] CRAN (R 4.0.0) #> shiny 1.5.0 2020-06-23 [1] CRAN (R 4.0.0) #> stringi 1.5.3 2020-09-09 [1] CRAN (R 4.0.0) #> stringr 1.4.0 2019-02-10 [1] CRAN (R 4.0.0) #> survival 3.1-12 2020-04-10 [2] CRAN (R 4.0.0) #> testthat 3.0.1 2020-12-17 [1] CRAN (R 4.0.0) #> tibble * 3.0.4 2020-10-12 [1] CRAN (R 4.0.0) #> tidymodels * 0.1.2 2020-11-22 [1] CRAN (R 4.0.0) #> tidyr * 1.1.2 2020-08-27 [1] CRAN (R 4.0.0) #> tidyselect 1.1.0 2020-05-11 [1] CRAN (R 4.0.0) #> timeDate 3043.102 2018-02-21 [1] CRAN (R 4.0.0) #> tune * 0.1.2 2020-11-17 [1] CRAN (R 4.0.0) #> usethis 2.0.0 2020-12-10 [1] CRAN (R 4.0.0) #> vctrs * 0.3.6 2020-12-17 [1] CRAN (R 4.0.0) #> withr 2.3.0 2020-09-22 [1] CRAN (R 4.0.0) #> workflows * 0.2.1 2020-10-08 [1] CRAN (R 4.0.0) #> xfun 0.19 2020-10-30 [1] CRAN (R 4.0.0) #> xtable 1.8-4 2019-04-21 [1] CRAN (R 4.0.0) #> yaml 2.2.1 2020-02-01 [1] CRAN (R 4.0.0) #> yardstick * 0.0.7 2020-07-13 [1] CRAN (R 4.0.0) #> #> [1] /home/roy/R/x86_64-pc-linux-gnu-library/4.0.0 #> [2] /usr/local/R/4.0.0/lib/R/library ```
github-actions[bot] commented 3 years ago

This issue has been automatically locked. If you believe you have found a related problem, please file a new issue (with a reprex: https://reprex.tidyverse.org) and link to this issue.