Skip to content

Commit

Permalink
added new lable function
Browse files Browse the repository at this point in the history
  • Loading branch information
topepo committed Jul 3, 2019
1 parent 4a06bdb commit 8c24fb1
Show file tree
Hide file tree
Showing 2 changed files with 6 additions and 4 deletions.
4 changes: 2 additions & 2 deletions R/lables.R
Expand Up @@ -140,14 +140,14 @@ pretty.nested_cv <- function(x, ...) {
print(class(x))
details <- attributes(x)

if (is_lang(details$outside)) {
if (is_call(details$outside)) {
class(x) <- class(x)[!(class(x) == "nested_cv")]
outer_label <- pretty(x)
} else {
outer_label <- paste0("`", deparse(details$outside), "`")
}

inner_label <- if (is_lang(details$inside))
inner_label <- if (is_call(details$inside))
pretty(x$inner_resamples[[1]])
else
paste0("`", deparse(details$inside), "`")
Expand Down
6 changes: 4 additions & 2 deletions man/add_resample_id.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 8c24fb1

Please sign in to comment.