Skip to content

Commit

Permalink
Review comments leading to dead commented code removal [ci skip]
Browse files Browse the repository at this point in the history
  • Loading branch information
eddelbuettel committed Feb 22, 2024
1 parent 217e581 commit b8fbdbe
Show file tree
Hide file tree
Showing 3 changed files with 0 additions and 23 deletions.
16 changes: 0 additions & 16 deletions R/ArrowIO.R
Original file line number Diff line number Diff line change
Expand Up @@ -85,22 +85,6 @@ tiledb_arrow_schema_del <- function(ptr) {
.delete_arrow_schema_from_xptr(ptr)
}

## ## ' @noRd
## .check_arrow_pointers <- function(arrlst) {
## stopifnot("First argument must be an external pointer to ArrowArray" = check_arrow_array_tag(arrlst[[1]]),
## "Second argument must be an external pointer to ArrowSchema" = check_arrow_schema_tag(arrlst[[2]]))
## }

## ## ' @noRd
## .as_arrow_table <- function(arrlst) {
## .check_arrow_pointers(arrlst)
## if (!requireNamespace("arrow", quietly=TRUE)) {
## stop("This functionality requires the 'arrow' package to be installed.", call. = FALSE)
## } else {
## arrow::as_arrow_table(arrow::RecordBatch$import_from_c(arrlst[[1]], arrlst[[2]]))
## }
## }

##' @noRd
.tiledb_set_arrow_config <- function(ctx = tiledb_get_context()) {
cfg <- tiledb_config() # for var-num columns such as char we need these
Expand Down
6 changes: 0 additions & 6 deletions R/TileDBArray.R
Original file line number Diff line number Diff line change
Expand Up @@ -491,12 +491,6 @@ setValidity("tiledb_array", function(object) {
bit64::as.integer64(val)
}

# ' @exportS3Method nanoarrow::as_arrow_table
#as_arrow_table.nanoarrow_array <- function(x, ..., schema = NULL) {
# print(class(x))
# arrow::as_arrow_table(x, schema = schema)
#}

#' Returns a TileDB array, allowing for specific subset ranges.
#'
#' Heterogenous domains are supported, including timestamps and characters.
Expand Down
1 change: 0 additions & 1 deletion inst/tinytest/test_timetravel.R
Original file line number Diff line number Diff line change
Expand Up @@ -56,7 +56,6 @@ while (deltat < 30) {
isTRUE(all.equal(NROW(res5), 20)) && # expects 2 groups, 2 and 3, with 20 obs
isTRUE(all.equal(min(res5$grp), 2)) &&
isTRUE(all.equal(max(res5$grp), 3))) {
#if (Sys.getenv("CI") != "") message("Success with gap time of ", deltat)
success <- TRUE
break
}
Expand Down

0 comments on commit b8fbdbe

Please sign in to comment.