@@ -128,75 +128,7 @@ test_file <- function(fname) testthat::test_path("ref", fname)
128128expect_proj_file <- function (... ) expect_true(file_exists(proj_path(... )))
129129expect_proj_dir <- function (... ) expect_true(dir_exists(proj_path(... )))
130130
131- mock_cran_version <- function (version , .env = caller_env()) {
132- local_mocked_bindings(cran_version = function () version , .env = .env )
133- }
134-
135131scrub_checklist_footer <- function (text ) {
136132 gsub(" (^<sup>.+on )[-/0-9]{10}(.+ v)[0-9.]{3,12}(.+</sup>$)" ,
137133 " \\ 1DATE\\ 2VERSION\\ 3" , text )
138134}
139-
140- mock_check_installed <- function (.env = caller_env()) {
141- local_mocked_bindings(
142- check_installed = function (... ) TRUE ,
143- .env = .env
144- )
145- }
146-
147- mock_check_is_package <- function (.env = caller_env()) {
148- local_mocked_bindings(
149- check_is_package = function (... ) invisible (),
150- .env = .env
151- )
152- }
153-
154- mock_rstudio_not_available <- function (.env = caller_env()) {
155- local_mocked_bindings(
156- rstudio_available = function (... ) FALSE ,
157- .env = .env
158- )
159- }
160-
161- mock_target_repo_spec <- function (spec = " OWNER/REPO" , .env = caller_env()) {
162- local_mocked_bindings(
163- target_repo_spec = function (... ) spec ,
164- .env = .env
165- )
166- }
167-
168- mock_roxygen_update_ns <- function (.env = caller_env()) {
169- local_mocked_bindings(
170- roxygen_update_ns = function (... ) NULL ,
171- .env = .env
172- )
173- }
174-
175- mock_check_functions_exist <- function (.env = caller_env()) {
176- local_mocked_bindings(
177- check_functions_exist = function (... ) TRUE ,
178- .env = .env
179- )
180- }
181-
182- mock_git_default_branch_remote <- function (remote = " upstream" , .env = caller_env()) {
183- local_mocked_bindings(
184- git_default_branch_remote = function (remote ) {
185- list (
186- name = remote ,
187- is_configured = TRUE ,
188- url = NA_character_ ,
189- repo_spec = NA_character_ ,
190- default_branch = as.character(glue(" default-branch-of-{remote}" ))
191- )
192- },
193- .env = .env
194- )
195- }
196-
197- mock_ui_yeah <- function (.env = caller_env()) {
198- local_mocked_bindings(
199- ui_yeah = function (... ) TRUE ,
200- .env = .env
201- )
202- }
0 commit comments