Skip to content

Commit

Permalink
Adds value tag to exported methods
Browse files Browse the repository at this point in the history
  • Loading branch information
edgararuiz committed Dec 17, 2023
1 parent e4e53f7 commit 6345ab9
Show file tree
Hide file tree
Showing 9 changed files with 24 additions and 3 deletions.
4 changes: 2 additions & 2 deletions CRAN-SUBMISSION
Original file line number Diff line number Diff line change
@@ -1,3 +1,3 @@
Version: 0.2.0
Date: 2023-12-14 19:49:39 UTC
SHA: fcaf79252a96bd6debd797f62651204ebcaa0653
Date: 2023-12-15 14:28:38 UTC
SHA: e4e53f71654d196197b434cfa7ea4ca4aab6e6bd
2 changes: 2 additions & 0 deletions R/connection-code.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,7 @@
#' Displays the code that will be used to recreate the connection
#' @param con A `connConnection` object
#' @returns It prints out the lines of code that this package will use
#' to reconnect to the database.
#' @export
connection_code <- function(con) {
session <- conn_session_get(con@id)
Expand Down
2 changes: 2 additions & 0 deletions R/connection-pin-read.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,6 +2,8 @@
#' @param board A `pins` board object
#' @param name The name of the pin
#' @param version The version of the pin to get (optional)
#' @returns It will return either the database connection, or the remote table
#' from a database.
#' @export
connection_pin_read <- function(board, name, version = NULL) {
pinned <- pin_read(board = board, name = name, version = version)
Expand Down
1 change: 1 addition & 0 deletions R/connection-pin-write.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,6 +2,7 @@
#' @param board A `pins` board object
#' @param x A `connections` table or database connection
#' @param ... Additional arguments to pass to `pins::pin_write()`
#' @returns It returns no output.
#' @export
connection_pin_write <- function(board, x, ...) {
write_pin_conn(
Expand Down
3 changes: 2 additions & 1 deletion R/connection-view.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,8 @@
#' @param host Name of Host of the connection
#' @param name Connection name
#' @param connection_id Unique ID of the connection for the current session
#'
#' @returns It populates the RStudio Connections pane. It returns nothing to the
#' console or session.
#' @examples
#' library(DBI)
#' con <- connection_open(RSQLite::SQLite(), path = ":dbname:")
Expand Down
4 changes: 4 additions & 0 deletions man/connection_code.Rd

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

4 changes: 4 additions & 0 deletions man/connection_pin_read.Rd

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

3 changes: 3 additions & 0 deletions man/connection_pin_write.Rd

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

4 changes: 4 additions & 0 deletions man/connection_view.Rd

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

0 comments on commit 6345ab9

Please sign in to comment.