@@ -18,13 +18,15 @@ tune_args.model_spec <- function(object, full = FALSE, ...) {
18
18
res <- c(arg_id , eng_arg_id )
19
19
res <- ifelse(res == " " , names(res ), res )
20
20
21
+ len_res <- length(res )
22
+
21
23
tune_tbl(
22
24
name = names(res ),
23
25
tunable = unname(! is.na(res )),
24
26
id = res ,
25
- source = " model_spec" ,
26
- component = model_type ,
27
- component_id = NA_character_ ,
27
+ source = rep( " model_spec" , len_res ) ,
28
+ component = rep( model_type , len_res ) ,
29
+ component_id = rep( NA_character_ , len_res ) ,
28
30
full = full
29
31
)
30
32
}
@@ -65,13 +67,16 @@ tune_tbl <- function(name = character(),
65
67
" ." , sep = " " , call. = FALSE )
66
68
}
67
69
68
- vry_tbl <- tibble :: tibble(
69
- name = as.character(name ),
70
- tunable = as.logical(tunable ),
71
- id = as.character(id ),
72
- source = as.character(source ),
73
- component = as.character(component ),
74
- component_id = as.character(component_id )
70
+ vry_tbl <- tibble :: new_tibble(
71
+ list (
72
+ name = as.character(name ),
73
+ tunable = as.logical(tunable ),
74
+ id = as.character(id ),
75
+ source = as.character(source ),
76
+ component = as.character(component ),
77
+ component_id = as.character(component_id )
78
+ ),
79
+ nrow = length(as.character(name ))
75
80
)
76
81
77
82
if (! full ) {
0 commit comments