Skip to content

Commit

Permalink
Avoid ::: in @examplesIf condition
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed May 29, 2024
1 parent c87c93b commit bf8813a
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 4 deletions.
3 changes: 1 addition & 2 deletions R/nanoparquet.R
Original file line number Diff line number Diff line change
Expand Up @@ -430,11 +430,10 @@ parquet_columns <- function(file) {
#'
#' @export
#' @seealso [parquet_metadata()], [read_parquet()].
#' @examplesIf !nanoparquet:::is_rcmd_check()
#' @examplesIf FALSE
#' # add row names as a column, because `write_parquet()` ignores them.
#' mtcars2 <- cbind(name = rownames(mtcars), mtcars)
#' write_parquet(mtcars2, "mtcars.parquet")
#' \dontshow{if (!nanoparquet:::is_rcmd_check()) unlink("mtcars.parquet")}

write_parquet <- function(
x,
Expand Down
3 changes: 1 addition & 2 deletions man/write_parquet.Rd

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

0 comments on commit bf8813a

Please sign in to comment.