Skip to content
Open
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
Package: adbi
Title: 'DBI' Compliant Database Access Using 'ADBC'
Version: 0.1.1
Version: 0.1.2
Authors@R:
c(person(given = "Nicolas",
family = "Bennett",
Expand Down
4 changes: 4 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
# adbi 0.1.2 (2024-09-03)

- Docs only update

# adbi 0.1.1 (2024-01-25)

- Update for adbcdrivermanager 0.9.0.1
Expand Down
4 changes: 2 additions & 2 deletions R/AdbiConnection.R
Original file line number Diff line number Diff line change
Expand Up @@ -24,8 +24,8 @@ AdbiConnection <- function(driver, ..., rows_affected_callback = identity,
#'
#' AdbiConnection objects are created by passing [adbi()] as first
#' argument to [DBI::dbConnect()]. They are a superclass of the
#' [DBIConnection-class] class. The "Usage" section lists the class methods
#' overridden by \pkg{adbi}.
#' [DBI::DBIConnection-class] class. The "Usage" section lists the class
#' methods overridden by \pkg{adbi}.
#'
#' @seealso
#' The corresponding generic functions
Expand Down
4 changes: 2 additions & 2 deletions R/AdbiDriver.R
Original file line number Diff line number Diff line change
Expand Up @@ -80,8 +80,8 @@ adbi <- function(driver = NA_character_) {
#' Class AdbiDriver (and methods)
#'
#' AdbiDriver objects are created by [adbi()], and used to select the
#' correct method in [dbConnect()]. They are a superclass of the
#' [DBIDriver-class] class, and used purely for dispatch.
#' correct method in [DBI::dbConnect()]. They are a superclass of the
#' [DBI::DBIDriver-class] class, and used purely for dispatch.
#' The "Usage" section lists the class methods overridden by \pkg{adbi}.
#'
#' @keywords internal
Expand Down
2 changes: 1 addition & 1 deletion R/AdbiResult.R
Original file line number Diff line number Diff line change
Expand Up @@ -106,7 +106,7 @@ new_result <- function(statement, immediate, prepared, type, sql,
#'
#' AdbiResult objects are created by [DBI::dbSendQuery()] or
#' [DBI::dbSendStatement()], and encapsulate the result of an SQL statement
#' (either `SELECT` or not). They are a superclass of the [DBIResult-class]
#' (either `SELECT` or not). They are a superclass of the [DBI::DBIResult-class]
#' class. The "Usage" section lists the class methods overridden by
#' \pkg{adbi}.
#'
Expand Down
4 changes: 2 additions & 2 deletions R/AdbiResultArrow.R
Original file line number Diff line number Diff line change
Expand Up @@ -20,8 +20,8 @@ AdbiResultArrow <- function(connection, statement, immediate = NULL,
#'
#' AdbiResultArrow objects are created by [DBI::dbSendQueryArrow()], and
#' encapsulate the result of an SQL query (a `SELECT` statement). They are a
#' superclass of the [DBIResultArrow-class] class. The "Usage" section lists
#' the class methods overridden by \pkg{adbi}.
#' superclass of the [DBI::DBIResultArrow-class] class. The "Usage" section
#' lists the class methods overridden by \pkg{adbi}.
#'
#' @seealso
#' The corresponding generic functions
Expand Down
2 changes: 2 additions & 0 deletions R/dbBegin_AdbiConnection.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,6 @@
#' @rdname AdbiConnection-class
#' @param conn A [DBI::DBIConnection][DBI::DBIConnection-class] object,
#' as returned by [DBI::dbConnect()].
#' @inheritParams DBI::dbBegin
#' @usage NULL
dbBegin_AdbiConnection <- function(conn, ...) {
Expand Down
1 change: 1 addition & 0 deletions R/dbClearResult_AdbiResult.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
#' @rdname AdbiResult-class
#' @param res An object inheriting from [DBI::DBIResult][DBI::DBIResult-class].
#' @inheritParams DBI::dbClearResult
#' @usage NULL
dbClearResult_AdbiResult <- function(res, ...) {
Expand Down
1 change: 1 addition & 0 deletions R/dbClearResult_AdbiResultArrow.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
#' @rdname AdbiResultArrow-class
#' @param res An object inheriting from [DBI::DBIResult][DBI::DBIResult-class].
#' @inheritParams DBI::dbClearResult
#' @usage NULL
dbClearResult_AdbiResultArrow <- function(res, ...) {
Expand Down
11 changes: 7 additions & 4 deletions R/dbConnect_AdbiDriver.R
Original file line number Diff line number Diff line change
@@ -1,19 +1,22 @@
#' @rdname dbConnect
#' @param ... Extra arguments passed to [dbConnect()] are forwarded to
#' @param drv An object that inherits from
#' [DBI::DBIDriver][DBI::DBIDriver-class],
#' or an existing [DBI::DBIConnection][DBI::DBIConnection-class]
#' object (in order to clone an existing connection).
#' @param ... Extra arguments passed to [DBI::dbConnect()] are forwarded to
#' [adbcdrivermanager::adbc_database_init()]
#' @param bigint The R type that 64-bit integer types should be mapped to,
#' default is [bit64::integer64], if bit64 is installed and `character`
#' otherwise
#' @inheritParams DBI::dbConnect
#' @examples
#' library(DBI)
#' con <- dbConnect(adbi())
#' dbIsValid(con)
#' dbDisconnect(con)
#' dbIsValid(con)
#' @return A connection object (S4 class `AdbiCOnnection`, inheriting from
#' [DBIConnection-class]) is returned by [dbConnect()], while
#' [dbDisconnect()] returns `TRUE` invisibly.
#' [DBI::DBIConnection-class]) is returned by [DBI::dbConnect()], while
#' [DBI::dbDisconnect()] returns `TRUE` invisibly.
#' @usage NULL
dbConnect_AdbiDriver <- function(drv, ..., bigint = NULL) {
AdbiConnection(drv, ..., bigint = bigint)
Expand Down
3 changes: 2 additions & 1 deletion R/dbDisconnect_AdbiConnection.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,8 @@
#' (default) or to simply inform about open results and mark the connection for
#' finalization (which is triggered when the last open result is closed).
#' @rdname dbConnect
#' @inheritParams DBI::dbDisconnect
#' @param conn A [DBI::DBIConnection][DBI::DBIConnection-class] object,
#' as returned by [DBI::dbConnect()].
#' @param force Close open results when disconnecting
#' @usage NULL
dbDisconnect_AdbiConnection <- function(conn,
Expand Down
19 changes: 11 additions & 8 deletions R/dbFetch_AdbiResult.R
Original file line number Diff line number Diff line change
@@ -1,15 +1,18 @@
#' Fetch result sets
#'
#' When fetching results using [dbFetch()], the argument `n` can be specified
#' to control chunk size per fetching operation. The default value of `-1`
#' corresponds to retrieving the entire result set at once, while a positive
#' integer will try returning as many rows (as long as `n` does not exceed the
#' available number of rows), in line with standard DBI expectations. As data
#' transfer is mediated by Arrow data structures, which are retrieved as array
#' chunks, the underlying chunk size can be used by passing an `n` value `NA`.
#' When fetching results using [DBI::dbFetch()], the argument `n` can be
#' specified to control chunk size per fetching operation. The default value of
#' `-1` corresponds to retrieving the entire result set at once, while a
#' positive integer will try returning as many rows (as long as `n` does not
#' exceed the available number of rows), in line with standard DBI
#' expectations. As data transfer is mediated by Arrow data structures, which
#' are retrieved as array chunks, the underlying chunk size can be used by
#' passing an `n` value `NA`.
#'
#' @rdname dbFetch
#' @inheritParams DBI::dbFetch
#' @param res An object inheriting from [DBI::DBIResult][DBI::DBIResult-class],
#' created by [DBI::dbSendQuery()].
#' @examples
#' if (requireNamespace("adbcsqlite")) {
#' library(DBI)
Expand All @@ -21,7 +24,7 @@
#' dbDisconnect(con)
#' }
#' @return A `data.frame` with the requested number of rows (or zero rows if
#' [dbFetch()] is called on a result set with no more remaining rows).
#' [DBI::dbFetch()] is called on a result set with no more remaining rows).
#' @usage NULL
dbFetch_AdbiResult <- function(res, n = -1, ...) {

Expand Down
2 changes: 2 additions & 0 deletions R/dbIsValid_AdbiConnection.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,6 @@
#' @rdname AdbiConnection-class
#' @param dbObj A object inheriting from [DBI::DBIDriver][DBI::DBIDriver-class]
#' or [DBI::DBIConnection][DBI::DBIConnection-class]
#' @inheritParams DBI::dbIsValid
#' @usage NULL
dbIsValid_AdbiConnection <- function(dbObj, ...) {
Expand Down
2 changes: 2 additions & 0 deletions R/dbIsValid_AdbiDriver.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,6 @@
#' @rdname AdbiDriver-class
#' @param dbObj A object inheriting from [DBI::DBIDriver][DBI::DBIDriver-class]
#' or [DBI::DBIConnection][DBI::DBIConnection-class]
#' @inheritParams DBI::dbIsValid
#' @usage NULL
dbIsValid_AdbiDriver <- function(dbObj, ...) {
Expand Down
3 changes: 3 additions & 0 deletions R/dbIsValid_AdbiResult.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,7 @@
#' @rdname AdbiResult-class
#' @param dbObj An object inheriting from [DBI::DBIObject-class],
#' i.e. [DBI::DBIDriver-class], [DBI::DBIConnection-class],
#' or a [DBI::DBIResult-class]
#' @inheritParams DBI::dbIsValid
#' @usage NULL
dbIsValid_AdbiResult <- function(dbObj, ...) {
Expand Down
3 changes: 3 additions & 0 deletions R/dbIsValid_AdbiResultArrow.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,7 @@
#' @rdname AdbiResultArrow-class
#' @param dbObj An object inheriting from [DBI::DBIObject-class],
#' i.e. [DBI::DBIDriver-class], [DBI::DBIConnection-class],
#' or a [DBI::DBIResult-class]
#' @inheritParams DBI::dbIsValid
#' @usage NULL
dbIsValid_AdbiResultArrow <- function(dbObj, ...) {
Expand Down
2 changes: 2 additions & 0 deletions R/dbQuoteIdentifier_AdbiConnection_character.R
Original file line number Diff line number Diff line change
@@ -1,3 +1,5 @@
#' @param x A character vector, [DBI::SQL] or [DBI::Id] object to quote as
#' identifier.
#' @rdname AdbiConnection-class
#' @inheritParams DBI::dbQuoteIdentifier
#' @usage NULL
Expand Down
2 changes: 1 addition & 1 deletion R/dbRemoveTable_AdbiConnection_character.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#' @rdname AdbiConnection-class
#' @param fail_if_missing If `FALSE`, `dbRemoveTable()` succeeds if the
#' @param fail_if_missing If `FALSE`, [DBI::dbRemoveTable()] succeeds if the
#' table doesn't exist.
#' @inheritParams DBI::dbRemoveTable
#' @usage NULL
Expand Down
11 changes: 7 additions & 4 deletions R/dbSendQuery_AdbiConnection_character.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
#' Create result sets
#'
#' Creating result sets using [dbSendQuery()] (and by extension using
#' [dbGetQuery()]) mostly follows DBI specification. One way where adbi
#' Creating result sets using [DBI::dbSendQuery()] (and by extension using
#' [DBI::dbGetQuery()]) mostly follows DBI specification. One way where adbi
#' deviates from DBI mechanisms is how the `bigint` setting is not only per
#' connection, but the per-connection setting can be overridden on a result
#' set basis. As default, the connection setting is applied, but passing one
Expand All @@ -15,7 +15,10 @@
#'
#' @seealso adbi-driver
#' @rdname dbSendQuery
#' @param params Optional query parameters (forwarded to [dbBind()])
#' @param conn A [DBI::DBIConnection][DBI::DBIConnection-class] object,
#' as returned by [DBI::dbConnect()].
#' @param statement a character string containing SQL.
#' @param params Optional query parameters (forwarded to [DBI::dbBind()])
#' @param immediate Passing a value `TRUE` is intended for statements containing
#' no placeholders and `FALSE` otherwise. The default value `NULL` will
#' inspect the statement for presence of placeholders (will `PREPARE` the
Expand All @@ -37,7 +40,7 @@
#' )
#' dbDisconnect(con)
#' }
#' @return An S4 class `AdbiResult` (inheriting from [DBIResult-class]).
#' @return An S4 class `AdbiResult` (inheriting from [DBI::DBIResult-class]).
#' @usage NULL
dbSendQuery_AdbiConnection_character <- function(conn, statement, ...,
params = NULL, immediate = NULL, bigint = NULL) {
Expand Down
4 changes: 2 additions & 2 deletions cran-comments.md
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
## Test environments

* local R installation, macOS 14.1.1, aarch64, R 4.2.2
* local R installation, macOS 15.6.1, aarch64, R 4.4.2
* GitHub Actions (ubuntu-22.04): devel, release, oldrel-1, oldrel-2, oldrel-3,
oldrel-4
* GitHub Actions (windows-latest): release, oldrel-3
Expand All @@ -11,4 +11,4 @@

0 errors | 0 warnings | 0 notes

* Update for adbcdrivermanager 0.9.0.1 compatibility
* Update fixing link targets in docs
17 changes: 9 additions & 8 deletions man/AdbiConnection-class.Rd

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

8 changes: 4 additions & 4 deletions man/AdbiDriver-class.Rd

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

10 changes: 5 additions & 5 deletions man/AdbiResult-class.Rd

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

12 changes: 6 additions & 6 deletions man/AdbiResultArrow-class.Rd

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

Loading
Loading