Skip to content

Commit

Permalink
remove keywords internal
Browse files Browse the repository at this point in the history
  • Loading branch information
Aleksander Chlebowski committed Mar 6, 2024
1 parent c6b5623 commit f151906
Show file tree
Hide file tree
Showing 4 changed files with 0 additions and 14 deletions.
5 changes: 0 additions & 5 deletions R/teal_slice.R
Original file line number Diff line number Diff line change
Expand Up @@ -174,15 +174,13 @@ teal_slice <- function(dataname,

#' @rdname teal_slice
#' @export
#' @keywords internal
#'
is.teal_slice <- function(x) { # nolint
inherits(x, "teal_slice")
}

#' @rdname teal_slice
#' @export
#' @keywords internal
#'
as.teal_slice <- function(x) { # nolint
checkmate::assert_list(x, names = "named")
Expand All @@ -191,7 +189,6 @@ as.teal_slice <- function(x) { # nolint

#' @rdname teal_slice
#' @export
#' @keywords internal
#'
as.list.teal_slice <- function(x, ...) {
formal_args <- setdiff(names(formals(teal_slice)), "...")
Expand All @@ -211,7 +208,6 @@ as.list.teal_slice <- function(x, ...) {

#' @rdname teal_slice
#' @export
#' @keywords internal
#'
format.teal_slice <- function(x, show_all = FALSE, trim_lines = TRUE, ...) {
checkmate::assert_flag(show_all)
Expand All @@ -225,7 +221,6 @@ format.teal_slice <- function(x, show_all = FALSE, trim_lines = TRUE, ...) {

#' @rdname teal_slice
#' @export
#' @keywords internal
#'
print.teal_slice <- function(x, ...) {
cat(format(x, ...))
Expand Down
7 changes: 0 additions & 7 deletions R/teal_slices.R
Original file line number Diff line number Diff line change
Expand Up @@ -129,7 +129,6 @@ teal_slices <- function(...,

#' @rdname teal_slices
#' @export
#' @keywords internal
#'
is.teal_slices <- function(x) { # nolint
inherits(x, "teal_slices")
Expand All @@ -138,7 +137,6 @@ is.teal_slices <- function(x) { # nolint

#' @rdname teal_slices
#' @export
#' @keywords internal
#'
as.teal_slices <- function(x) { # nolint
checkmate::assert_list(x)
Expand All @@ -152,7 +150,6 @@ as.teal_slices <- function(x) { # nolint

#' @rdname teal_slices
#' @export
#' @keywords internal
#'
as.list.teal_slices <- function(x, recursive = FALSE, ...) { # nolint
ans <- unclass(x)
Expand All @@ -163,7 +160,6 @@ as.list.teal_slices <- function(x, recursive = FALSE, ...) { # nolint

#' @rdname teal_slices
#' @export
#' @keywords internal
#'
`[.teal_slices` <- function(x, i) {
if (missing(i)) i <- seq_along(x)
Expand All @@ -187,7 +183,6 @@ as.list.teal_slices <- function(x, recursive = FALSE, ...) { # nolint

#' @rdname teal_slices
#' @export
#' @keywords internal
#'
c.teal_slices <- function(...) {
x <- list(...)
Expand All @@ -211,7 +206,6 @@ c.teal_slices <- function(...) {
#' @param show_all (`logical(1)`) whether to display non-null elements of constituent `teal_slice` objects
#' @param trim_lines (`logical(1)`) whether to trim lines
#' @export
#' @keywords internal
#'
format.teal_slices <- function(x, show_all = FALSE, trim_lines = TRUE, ...) {
checkmate::assert_flag(show_all)
Expand All @@ -230,7 +224,6 @@ format.teal_slices <- function(x, show_all = FALSE, trim_lines = TRUE, ...) {

#' @rdname teal_slices
#' @export
#' @keywords internal
#'
print.teal_slices <- function(x, ...) {
cat(format(x, ...), "\n")
Expand Down
1 change: 0 additions & 1 deletion man/teal_slice.Rd

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

1 change: 0 additions & 1 deletion man/teal_slices.Rd

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

0 comments on commit f151906

Please sign in to comment.