Skip to content

Commit 2789b86

Browse files
committed
Specify what to join by and document
1 parent 3717f6d commit 2789b86

File tree

2 files changed

+11
-6
lines changed

2 files changed

+11
-6
lines changed

R/aaa.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -30,6 +30,7 @@ convert_stan_interval <- function(x, level = 0.95, lower = TRUE) {
3030
res
3131
}
3232

33+
#' Find args for documentation
3334
#' @rdname convert_args
3435
#' @keywords internal
3536
#' @export
@@ -45,7 +46,8 @@ convert_args <- function(model_name) {
4546
dplyr::filter(grepl(model_name, model)) %>%
4647
tidyr::unnest(args) %>%
4748
dplyr::select(model:original) %>%
48-
full_join(get_arg_defaults(model_name)) %>%
49+
full_join(get_arg_defaults(model_name),
50+
by = c("model", "engine", "parsnip", "original")) %>%
4951
mutate(original = dplyr::if_else(!is.na(default),
5052
paste0(original, " (", default, ")"),
5153
original)) %>%

man/convert_args.Rd

Lines changed: 8 additions & 5 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)