Skip to content

Commit dc61a9e

Browse files
committed
Merge pull request #795 from uribo/patch_gh
[FIX]correct name for GitHub
2 parents 6929aa2 + 9b7d0eb commit dc61a9e

6 files changed

+12
-12
lines changed

R/doctor.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -58,7 +58,7 @@ dr_devtools <- function() {
5858
doctor("devtools", msg)
5959
}
6060

61-
#' Diagnose potential github issues
61+
#' Diagnose potential GitHub issues
6262
#'
6363
#' @param path Path to repository to check. Defaults to current working
6464
#' directory

R/git.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -88,7 +88,7 @@ github_remote_parse <- function(x) {
8888
# [email protected]:hadley/devtools.git
8989
re <- "github.com:(.*?)/(.*)\\.git"
9090
} else {
91-
stop("Unknown github repo format", call. = FALSE)
91+
stop("Unknown GitHub repo format", call. = FALSE)
9292
}
9393

9494
m <- regexec(re, x)

R/infrastructure-git.R

+3-3
Original file line numberDiff line numberDiff line change
@@ -27,7 +27,7 @@ use_git <- function(message = "Initial commit", pkg = ".") {
2727
invisible()
2828
}
2929

30-
#' Connect a local repo with github.
30+
#' Connect a local repo with GitHub.
3131
#'
3232
#' If the current repo does not use git, calls \code{use_git} automatically.
3333
#'
@@ -49,15 +49,15 @@ use_github <- function(auth_token = github_pat(), private = FALSE, pkg = ".") {
4949
if ("origin" %in% git2r::remotes(r))
5050
return(invisible())
5151

52-
message("Creating github repository")
52+
message("Creating GitHub repository")
5353

5454
create <- github_POST("user/repos", pat = auth_token, body = list(
5555
name = jsonlite::unbox(pkg$package),
5656
description = jsonlite::unbox(pkg$description),
5757
private = jsonlite::unbox(private)
5858
))
5959

60-
message("Adding remote to github")
60+
message("Adding remote to GitHub")
6161
git2r::remote_add(r, "origin", create$ssh_url)
6262
# git2r::branch_set_upstream(head(r), "origin/master")
6363
# git2r::push(r, "origin", "refs/heads/master")

R/install-github.r

+4-4
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Attempts to install a package directly from github.
1+
#' Attempts to install a package directly from GitHub.
22
#'
33
#' This function is vectorised on \code{repo} so you can install multiple
44
#' packages in a single command.
@@ -18,7 +18,7 @@
1818
#' supply to this argument. This is safer than using a password because
1919
#' you can easily delete a PAT without affecting any others. Defaults to
2020
#' the \code{GITHUB_PAT} environment variable.
21-
#' @param host Github API host to use. Override with your github enterprise
21+
#' @param host GitHub API host to use. Override with your GitHub enterprise
2222
#' hostname, for example, \code{"github.hostname.com/api/v3"}.
2323
#' @param ... Other arguments passed on to \code{\link{install}}.
2424
#' @details
@@ -89,7 +89,7 @@ github_remote <- function(repo, username = NULL, ref = NULL, subdir = NULL,
8989
#' @export
9090
remote_download.github_remote <- function(x, quiet = FALSE) {
9191
if (!quiet) {
92-
message("Downloading github repo ", x$username, "/", x$repo, "@", x$ref)
92+
message("Downloading GitHub repo ", x$username, "/", x$repo, "@", x$ref)
9393
}
9494

9595
dest <- tempfile(fileext = paste0(".zip"))
@@ -107,7 +107,7 @@ remote_download.github_remote <- function(x, quiet = FALSE) {
107107
}
108108

109109
if (github_has_remotes(x, auth))
110-
warning("Github repo contains submodules, may not function as expected!",
110+
warning("GitHub repo contains submodules, may not function as expected!",
111111
call. = FALSE)
112112

113113
download(dest, src, auth)

man/install_github.Rd

+2-2
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,7 @@
22
% Please edit documentation in R/install-github.r
33
\name{install_github}
44
\alias{install_github}
5-
\title{Attempts to install a package directly from github.}
5+
\title{Attempts to install a package directly from GitHub.}
66
\usage{
77
install_github(repo, username = NULL, ref = "master", subdir = NULL,
88
auth_token = github_pat(), host = "api.github.com", ...)
@@ -28,7 +28,7 @@ supply to this argument. This is safer than using a password because
2828
you can easily delete a PAT without affecting any others. Defaults to
2929
the \code{GITHUB_PAT} environment variable.}
3030

31-
\item{host}{Github API host to use. Override with your github enterprise
31+
\item{host}{GitHub API host to use. Override with your GitHub enterprise
3232
hostname, for example, \code{"github.hostname.com/api/v3"}.}
3333

3434
\item{...}{Other arguments passed on to \code{\link{install}}.}

man/use_github.Rd

+1-1
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,7 @@
22
% Please edit documentation in R/infrastructure-git.R
33
\name{use_github}
44
\alias{use_github}
5-
\title{Connect a local repo with github.}
5+
\title{Connect a local repo with GitHub.}
66
\usage{
77
use_github(auth_token = github_pat(), private = FALSE, pkg = ".")
88
}

0 commit comments

Comments
 (0)