Skip to content

Commit 7404ef4

Browse files
committed
remove changes made in other PRs
1 parent fbded54 commit 7404ef4

File tree

7 files changed

+5
-132
lines changed

7 files changed

+5
-132
lines changed

cpp11test/R/cpp11.R

Lines changed: 0 additions & 12 deletions
Original file line numberDiff line numberDiff line change
@@ -88,18 +88,6 @@ cpp11_insert_ <- function(num_sxp) {
8888
.Call(`_cpp11test_cpp11_insert_`, num_sxp)
8989
}
9090

91-
ordered_map_to_list_ <- function(x) {
92-
.Call(`_cpp11test_ordered_map_to_list_`, x)
93-
}
94-
95-
ordered_map_to_list_2_ <- function(x) {
96-
.Call(`_cpp11test_ordered_map_to_list_2_`, x)
97-
}
98-
99-
unordered_map_to_list_ <- function(x) {
100-
.Call(`_cpp11test_unordered_map_to_list_`, x)
101-
}
102-
10391
gibbs_cpp <- function(N, thin) {
10492
.Call(`_cpp11test_gibbs_cpp`, N, thin)
10593
}

cpp11test/src/cpp11.cpp

Lines changed: 5 additions & 27 deletions
Original file line numberDiff line numberDiff line change
@@ -173,27 +173,6 @@ extern "C" SEXP _cpp11test_cpp11_insert_(SEXP num_sxp) {
173173
return cpp11::as_sexp(cpp11_insert_(cpp11::as_cpp<cpp11::decay_t<SEXP>>(num_sxp)));
174174
END_CPP11
175175
}
176-
// map.cpp
177-
SEXP ordered_map_to_list_(cpp11::doubles x);
178-
extern "C" SEXP _cpp11test_ordered_map_to_list_(SEXP x) {
179-
BEGIN_CPP11
180-
return cpp11::as_sexp(ordered_map_to_list_(cpp11::as_cpp<cpp11::decay_t<cpp11::doubles>>(x)));
181-
END_CPP11
182-
}
183-
// map.cpp
184-
SEXP ordered_map_to_list_2_(cpp11::doubles x);
185-
extern "C" SEXP _cpp11test_ordered_map_to_list_2_(SEXP x) {
186-
BEGIN_CPP11
187-
return cpp11::as_sexp(ordered_map_to_list_2_(cpp11::as_cpp<cpp11::decay_t<cpp11::doubles>>(x)));
188-
END_CPP11
189-
}
190-
// map.cpp
191-
SEXP unordered_map_to_list_(cpp11::doubles x);
192-
extern "C" SEXP _cpp11test_unordered_map_to_list_(SEXP x) {
193-
BEGIN_CPP11
194-
return cpp11::as_sexp(unordered_map_to_list_(cpp11::as_cpp<cpp11::decay_t<cpp11::doubles>>(x)));
195-
END_CPP11
196-
}
197176
// matrix.cpp
198177
SEXP gibbs_cpp(int N, int thin);
199178
extern "C" SEXP _cpp11test_gibbs_cpp(SEXP N, SEXP thin) {
@@ -630,12 +609,12 @@ static const R_CallMethodDef CallEntries[] = {
630609
{"_cpp11test_gibbs_rcpp", (DL_FUNC) &_cpp11test_gibbs_rcpp, 2},
631610
{"_cpp11test_gibbs_rcpp2", (DL_FUNC) &_cpp11test_gibbs_rcpp2, 2},
632611
{"_cpp11test_grow_", (DL_FUNC) &_cpp11test_grow_, 1},
633-
{"_cpp11test_mat_mat_copy_dimnames", (DL_FUNC) &_cpp11test_mat_mat_copy_dimnames, 1},
634-
{"_cpp11test_mat_mat_create_dimnames", (DL_FUNC) &_cpp11test_mat_mat_create_dimnames, 0},
635-
{"_cpp11test_mat_sexp_copy_dimnames", (DL_FUNC) &_cpp11test_mat_sexp_copy_dimnames, 1},
636612
{"_cpp11test_grow_strings_cpp11_", (DL_FUNC) &_cpp11test_grow_strings_cpp11_, 2},
637613
{"_cpp11test_grow_strings_manual_", (DL_FUNC) &_cpp11test_grow_strings_manual_, 2},
638614
{"_cpp11test_grow_strings_rcpp_", (DL_FUNC) &_cpp11test_grow_strings_rcpp_, 2},
615+
{"_cpp11test_mat_mat_copy_dimnames", (DL_FUNC) &_cpp11test_mat_mat_copy_dimnames, 1},
616+
{"_cpp11test_mat_mat_create_dimnames", (DL_FUNC) &_cpp11test_mat_mat_create_dimnames, 0},
617+
{"_cpp11test_mat_sexp_copy_dimnames", (DL_FUNC) &_cpp11test_mat_sexp_copy_dimnames, 1},
639618
{"_cpp11test_my_message", (DL_FUNC) &_cpp11test_my_message, 2},
640619
{"_cpp11test_my_message_n1", (DL_FUNC) &_cpp11test_my_message_n1, 1},
641620
{"_cpp11test_my_message_n1fmt", (DL_FUNC) &_cpp11test_my_message_n1fmt, 1},
@@ -648,8 +627,8 @@ static const R_CallMethodDef CallEntries[] = {
648627
{"_cpp11test_my_warning_n1", (DL_FUNC) &_cpp11test_my_warning_n1, 1},
649628
{"_cpp11test_my_warning_n1fmt", (DL_FUNC) &_cpp11test_my_warning_n1fmt, 1},
650629
{"_cpp11test_my_warning_n2fmt", (DL_FUNC) &_cpp11test_my_warning_n2fmt, 2},
651-
{"_cpp11test_ordered_map_to_list_", (DL_FUNC) &_cpp11test_ordered_map_to_list_, 1},
652-
{"_cpp11test_ordered_map_to_list_2_", (DL_FUNC) &_cpp11test_ordered_map_to_list_2_, 1},
630+
{"_cpp11test_notroxcpp1_", (DL_FUNC) &_cpp11test_notroxcpp1_, 1},
631+
{"_cpp11test_notroxcpp6_", (DL_FUNC) &_cpp11test_notroxcpp6_, 1},
653632
{"_cpp11test_nullable_extptr_1", (DL_FUNC) &_cpp11test_nullable_extptr_1, 0},
654633
{"_cpp11test_nullable_extptr_2", (DL_FUNC) &_cpp11test_nullable_extptr_2, 0},
655634
{"_cpp11test_protect_many_", (DL_FUNC) &_cpp11test_protect_many_, 1},
@@ -690,7 +669,6 @@ static const R_CallMethodDef CallEntries[] = {
690669
{"_cpp11test_sum_int_foreach_", (DL_FUNC) &_cpp11test_sum_int_foreach_, 1},
691670
{"_cpp11test_test_destruction_inner", (DL_FUNC) &_cpp11test_test_destruction_inner, 0},
692671
{"_cpp11test_test_destruction_outer", (DL_FUNC) &_cpp11test_test_destruction_outer, 0},
693-
{"_cpp11test_unordered_map_to_list_", (DL_FUNC) &_cpp11test_unordered_map_to_list_, 1},
694672
{"_cpp11test_upper_bound", (DL_FUNC) &_cpp11test_upper_bound, 2},
695673
{"run_testthat_tests", (DL_FUNC) &run_testthat_tests, 1},
696674
{NULL, NULL, 0}

cpp11test/src/map.cpp

Lines changed: 0 additions & 29 deletions
This file was deleted.

cpp11test/src/test-doubles.cpp

Lines changed: 0 additions & 16 deletions
Original file line numberDiff line numberDiff line change
@@ -455,22 +455,6 @@ context("doubles-C++") {
455455
expect_true(!cpp11::is_na(na2[1]));
456456
}
457457

458-
test_that("as_doubles(logicals)") {
459-
cpp11::writable::logicals y;
460-
461-
for (int i = 0; i < 4; i++) {
462-
y.push_back(i % 2 == 0);
463-
}
464-
465-
cpp11::doubles i(cpp11::as_doubles(y));
466-
467-
expect_true(i[0] == 1.0);
468-
expect_true(i[1] == 0.0);
469-
expect_true(i[2] == 1.0);
470-
expect_true(i[3] == 0.0);
471-
expect_true(cpp11::detail::r_typeof(i) == REALSXP);
472-
}
473-
474458
test_that("doubles operator[] and at") {
475459
cpp11::doubles x(Rf_allocVector(REALSXP, 2));
476460
REAL(x)[0] = 1;

cpp11test/src/test-integers.cpp

Lines changed: 0 additions & 16 deletions
Original file line numberDiff line numberDiff line change
@@ -44,22 +44,6 @@ context("integers-C++") {
4444
expect_true(!cpp11::is_na(na2[1]));
4545
}
4646

47-
test_that("as_integers(logicals)") {
48-
cpp11::writable::logicals y;
49-
50-
for (int i = 0; i < 4; i++) {
51-
y.push_back(i % 2 == 0);
52-
}
53-
54-
cpp11::integers i(cpp11::as_integers(y));
55-
56-
expect_true(i[0] == 1);
57-
expect_true(i[1] == 0);
58-
expect_true(i[2] == 1);
59-
expect_true(i[3] == 0);
60-
expect_true(cpp11::detail::r_typeof(i) == INTSXP);
61-
}
62-
6347
test_that("integers.push_back()") {
6448
cpp11::writable::integers x;
6549
x.push_back(1);

cpp11test/tests/testthat/test-external-pointer.R

Lines changed: 0 additions & 11 deletions
This file was deleted.

cpp11test/tests/testthat/test-map-to-list.R

Lines changed: 0 additions & 21 deletions
This file was deleted.

0 commit comments

Comments
 (0)