Skip to content

Commit

Permalink
Make db_create_indexes generic; export (tidyverse#1916)
Browse files Browse the repository at this point in the history
* Update backend_db docs

* Make db_create_indexes generic; export
  • Loading branch information
imanuelcostigan authored and hadley committed Jun 13, 2016
1 parent 517c662 commit b21fc8f
Showing 1 changed file with 8 additions and 0 deletions.
8 changes: 8 additions & 0 deletions R/dbi-s3.r
Original file line number Diff line number Diff line change
Expand Up @@ -156,7 +156,15 @@ db_insert_into <- function(con, table, values, ...) {
UseMethod("db_insert_into")
}

#' @name backend_db
#' @export
db_create_indexes <- function(con, table, indexes = NULL, unique = FALSE, ...) {
UseMethod("db_create_indexes")
}

#' @export
db_create_indexes.DBIConnection <- function(con, table, indexes = NULL,
unique = FALSE, ...) {
if (is.null(indexes)) return()
assert_that(is.list(indexes))

Expand Down

0 comments on commit b21fc8f

Please sign in to comment.