Skip to content

Commit 13f4dde

Browse files
krlmlrmaelle
andauthored
docs: improve documentation of prudence argument (#593)
* docs: improve documentation of `prudence` argument * Revert bullets * Clarify bullets * Document --------- Co-authored-by: Maëlle Salmon <maelle.salmon@yahoo.se>
1 parent dc2967f commit 13f4dde

File tree

8 files changed

+19
-8
lines changed

8 files changed

+19
-8
lines changed

R/compute-rd.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -12,13 +12,15 @@
1212
#' @param name The name of the table to store the result in.
1313
#' @param schema_name The schema to store the result in, defaults to the current schema.
1414
#' @param temporary Set to `FALSE` to store the result in a permanent table.
15-
#' @param prudence Convenience argument to control automatic materialization of data.
15+
#' @param prudence Memory protection, controls if DuckDB may convert
16+
#' intermediate results in DuckDB-managed memory to data frames in R memory.
1617
#'
1718
#' - `"lavish"`: regardless of size,
1819
#' - `"frugal"`: never,
1920
#' - `"thrifty"`: up to a maximum size of 1 million cells.
2021
#'
2122
#' The default is to inherit from the input.
23+
#' This argument is provided here only for convenience.
2224
#' The same effect can be achieved by forwarding the output to [as_duckdb_tibble()]
2325
#' with the desired prudence.
2426
#' See `vignette("prudence")` for more information.

R/ducktbl.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,8 @@
1111
#'
1212
#' @param ... For `duckdb_tibble()`, passed on to [tibble()].
1313
#' For `as_duckdb_tibble()`, passed on to methods.
14-
#' @param prudence,.prudence Controls automatic materialization of data.
14+
#' @param prudence,.prudence Memory protection, controls if DuckDB may convert
15+
#' intermediate results in DuckDB-managed memory to data frames in R memory.
1516
#'
1617
#' - `"lavish"`: regardless of size,
1718
#' - `"frugal"`: never,

R/io2.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -90,7 +90,8 @@ read_json_duckdb <- function(path, ..., prudence = c("thrifty", "lavish", "fruga
9090
#' @param table_function The name of a table-valued
9191
#' DuckDB function such as `"read_parquet"`,
9292
#' `"read_csv"`, `"read_csv_auto"` or `"read_json"`.
93-
#' @param prudence Controls automatic materialization of data.
93+
#' @param prudence Memory protection, controls if DuckDB may convert
94+
#' intermediate results in DuckDB-managed memory to data frames in R memory.
9495
#'
9596
#' - `"thrifty"`: up to a maximum size of 1 million cells,
9697
#' - `"lavish"`: regardless of size,

man/compute.duckplyr_df.Rd

Lines changed: 3 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/compute_file.Rd

Lines changed: 3 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/duckdb_tibble.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/read_file_duckdb.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/read_sql_duckdb.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)