Skip to content

Commit

Permalink
removed at_end arg as we were not using it and likely will not eith…
Browse files Browse the repository at this point in the history
…er in future (discussed in #216)
  • Loading branch information
hfrick committed Feb 10, 2021
1 parent 5874b1c commit 3bc4cb8
Showing 1 changed file with 2 additions and 5 deletions.
7 changes: 2 additions & 5 deletions R/misc.R
Original file line number Diff line number Diff line change
Expand Up @@ -33,11 +33,8 @@ names0 <- function(num, prefix = "x") {
paste0(prefix, ind)
}

add_class <- function(x, cls, at_end = FALSE) {
class(x) <- if (at_end)
c(class(x), cls)
else
c(cls, class(x))
add_class <- function(x, cls) {
class(x) <- c(cls, class(x))
x
}

Expand Down

0 comments on commit 3bc4cb8

Please sign in to comment.