@@ -10,7 +10,7 @@ github_GET <- function(path, ..., host = "api.github.com", pat = github_pat(), u
1010 }
1111 )
1212
13- res <- curl_fetch_memory (url , headers )
13+ res <- github_curl_fetch_memory (url , headers )
1414 json $ parse(raw_to_char_utf8(res $ content ))
1515 } else {
1616 tmp <- tempfile()
@@ -36,7 +36,7 @@ github_commit <- function(username, repo, ref = "HEAD",
3636 }
3737 )
3838
39- res <- curl_fetch_memory (url , headers , accept = 304 )
39+ res <- github_curl_fetch_memory (url , headers , accept = 304 )
4040
4141 if (res $ status_code == 304 ) {
4242 return (current_sha )
@@ -114,7 +114,7 @@ github_DESCRIPTION <- function(username, repo, subdir = NULL, ref = "HEAD", host
114114 }
115115 )
116116
117- res <- curl_fetch_memory (url , headers )
117+ res <- github_curl_fetch_memory (url , headers )
118118
119119 raw_to_char_utf8(res $ content )
120120 } else {
@@ -128,7 +128,7 @@ github_DESCRIPTION <- function(username, repo, subdir = NULL, ref = "HEAD", host
128128 }
129129}
130130
131- curl_fetch_memory <- function (url , headers , accept = NULL ) {
131+ github_curl_fetch_memory <- function (url , headers , accept = NULL ) {
132132 h <- curl :: new_handle()
133133 curl :: handle_setheaders(h , .list = headers )
134134 res <- curl :: curl_fetch_memory(url , handle = h )
0 commit comments