Skip to content

Commit

Permalink
rename C_duplicate to duplicate_
Browse files Browse the repository at this point in the history
  • Loading branch information
Kirill Müller committed Sep 22, 2014
1 parent 3208491 commit f38b381
Show file tree
Hide file tree
Showing 3 changed files with 4 additions and 4 deletions.
2 changes: 1 addition & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -84,5 +84,5 @@ exportClasses(SummaryReporter)
exportClasses(TapReporter)
exportClasses(TeamcityReporter)
importFrom(methods,setRefClass)
useDynLib(testthat,C_duplicate)
useDynLib(testthat,duplicate_)
useDynLib(testthat,reassign_function)
4 changes: 2 additions & 2 deletions R/mock.r
Original file line number Diff line number Diff line change
Expand Up @@ -86,12 +86,12 @@ extract_mocks <- function(new_values, .env) {
)
}

#' @useDynLib testthat C_duplicate
#' @useDynLib testthat duplicate_
mock <- function(name, env, new) {
target_value <- get(name, env, mode = "function")
structure(list(
env = env, name = name,
orig_value = .Call(C_duplicate, target_value), target_value = target_value,
orig_value = .Call(duplicate_, target_value), target_value = target_value,
new_value = new), class = "mock")
}

Expand Down
2 changes: 1 addition & 1 deletion src/reassign.c
Original file line number Diff line number Diff line change
Expand Up @@ -19,6 +19,6 @@ SEXP reassign_function(SEXP name, SEXP env, SEXP old_fun, SEXP new_fun)
return R_NilValue;
}

SEXP C_duplicate(SEXP x) {
SEXP duplicate_(SEXP x) {
return duplicate(x);
}

0 comments on commit f38b381

Please sign in to comment.