Skip to content

Commit

Permalink
docs: Tweak (#56)
Browse files Browse the repository at this point in the history
Closes #56.
  • Loading branch information
krlmlr committed Sep 19, 2023
1 parent 05e45a1 commit e49401f
Show file tree
Hide file tree
Showing 8 changed files with 27 additions and 7 deletions.
5 changes: 4 additions & 1 deletion R/as_duckplyr_df.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,10 @@
#'
#' For an object of class `duckplyr_df`,
#' dplyr verbs such as [mutate()], [select()] or [filter()] will attempt to use DuckDB.
#' If this is not possible for whatever reason, the original dplyr implementation is used.
#' If this is not possible, the original dplyr implementation is used.
#'
#' Set the `DUCKPLYR_FALLBACK_INFO` and `DUCKPLYR_FORCE` environment variables
#' for more control over the behavior, see [config] for more details.
#'
#' @param .data data frame or tibble to transform
#'
Expand Down
2 changes: 1 addition & 1 deletion R/config.R
Original file line number Diff line number Diff line change
Expand Up @@ -12,7 +12,7 @@
#' @section Environment variables:
#'
#' `DUCKPLYR_OUTPUT_ORDER`: If `TRUE`, row output order is preserved.
#' If `FALSE`,
#' The default may change the row order where dplyr would keep it stable.
#'
#' `DUCKPLYR_FORCE`: If `TRUE`, fail if duckdb cannot handle a request.
#'
Expand Down
7 changes: 6 additions & 1 deletion R/csv.R
Original file line number Diff line number Diff line change
Expand Up @@ -34,7 +34,12 @@
#' df$a
#'
#' # Return as tibble:
#' df_from_file(path, "read_csv_auto", class = class(tibble()))
#' df_from_file(
#' path,
#' "read_csv",
#' options = list(delim = ",", auto_detect = TRUE),
#' class = class(tibble())
#' )
#'
#' unlink(path)
df_from_file <- function(path,
Expand Down
3 changes: 2 additions & 1 deletion R/stats.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,8 @@ stats <- new_environment(list(attempts = 0L, fallback = 0L, calls = character())
#' Show stats
#'
#' Prints statistics on how many calls were handled by DuckDB.
#'
#' The output shows the total number of requests in the current session,
#' split by fallbacks to dplyr and requests handled by duckdb.
#'
#' @return Called for its side effect.
#'
Expand Down
6 changes: 5 additions & 1 deletion man/as_duckplyr_df.Rd

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

2 changes: 1 addition & 1 deletion man/config.Rd

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

7 changes: 6 additions & 1 deletion man/df_from_file.Rd

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

2 changes: 2 additions & 0 deletions man/stats_show.Rd

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

0 comments on commit e49401f

Please sign in to comment.