Skip to content

Commit

Permalink
Register missing S3 methods
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Mar 17, 2024
1 parent aef840b commit 8d6f5ad
Show file tree
Hide file tree
Showing 5 changed files with 15 additions and 0 deletions.
3 changes: 3 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -40,6 +40,7 @@ S3method(remote_package_name,bioc_git2r_remote)
S3method(remote_package_name,bioc_xgit_remote)
S3method(remote_package_name,bitbucket_remote)
S3method(remote_package_name,cran_remote)
S3method(remote_package_name,default)
S3method(remote_package_name,git2r_remote)
S3method(remote_package_name,github_remote)
S3method(remote_package_name,gitlab_remote)
Expand All @@ -48,8 +49,10 @@ S3method(remote_package_name,svn_remote)
S3method(remote_package_name,url_remote)
S3method(remote_package_name,xgit_remote)
S3method(remote_sha,bioc_git2r_remote)
S3method(remote_sha,bioc_xgit_remote)
S3method(remote_sha,bitbucket_remote)
S3method(remote_sha,cran_remote)
S3method(remote_sha,default)
S3method(remote_sha,git2r_remote)
S3method(remote_sha,github_remote)
S3method(remote_sha,gitlab_remote)
Expand Down
1 change: 1 addition & 0 deletions R/install-bioc.R
Original file line number Diff line number Diff line change
Expand Up @@ -236,6 +236,7 @@ remote_sha.bioc_git2r_remote <- function(remote, ...) {
}, error = function(e) NA_character_)
}

#' @export
remote_sha.bioc_xgit_remote <- function(remote, ...) {
url <- paste0(remote$mirror, "/", remote$repo)
ref <- remote$branch
Expand Down
3 changes: 3 additions & 0 deletions R/install-remote.R
Original file line number Diff line number Diff line change
Expand Up @@ -182,7 +182,10 @@ remote_package_name <- function(remote, ...) UseMethod("remote_package_name")
#' @export
remote_sha <- function(remote, ...) UseMethod("remote_sha")

#' @export
remote_package_name.default <- function(remote, ...) remote$repo

#' @export
remote_sha.default <- function(remote, ...) NA_character_

different_sha <- function(remote_sha, local_sha) {
Expand Down
4 changes: 4 additions & 0 deletions inst/install-github.R

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

4 changes: 4 additions & 0 deletions install-github.R

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

0 comments on commit 8d6f5ad

Please sign in to comment.