Skip to content

Commit e5039ba

Browse files
committed
Clean up
1 parent 02b3617 commit e5039ba

File tree

1 file changed

+2
-13
lines changed

1 file changed

+2
-13
lines changed

R/subsetting.R

Lines changed: 2 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -130,7 +130,8 @@ NULL
130130
if (is.null(x)) {
131131
x
132132
} else {
133-
vectbl_strip_names(vec_slice(x, i))
133+
# Drop inner names with double subscript
134+
vec_set_names(vec_slice(x, i), NULL)
134135
}
135136
}
136137
}
@@ -684,18 +685,6 @@ vectbl_assign <- function(x, i, value) {
684685
vec_assign(x, i, value)
685686
}
686687

687-
vectbl_strip_names <- function(x) {
688-
maybe_row_names <- is.data.frame(x) || is.array(x)
689-
690-
if (maybe_row_names) {
691-
row.names(x) <- NULL
692-
} else {
693-
names(x) <- NULL
694-
}
695-
696-
x
697-
}
698-
699688
vectbl_wrap_rhs_col <- function(value, value_arg) {
700689
if (is.null(value)) {
701690
return(list(value))

0 commit comments

Comments
 (0)