@@ -160,28 +160,57 @@ notroxcpp1_ <- function(x) {
160160 .Call(`_cpp11test_notroxcpp1_` , x )
161161}
162162
163+ # ' @title Roxygenise C++ function II
164+ # ' @param x numeric value
165+ # ' @description Dummy function to test roxygen2. It adds 2.0 to a double.
166+ # ' @export
167+ # ' @examples roxcpp2_(1.0)
163168roxcpp2_ <- function (x ) {
164- .Call(`_cpp11test_roxcpp2_` , x )
169+ .Call(`_cpp11test_roxcpp2_` , x )
165170}
166171
172+ # ' @title Roxygenise C++ function III
173+ # ' @param x numeric value
174+ # ' @description Dummy function to test roxygen2. It adds 3.0 to a double.
175+ # ' @export
176+ # ' @examples roxcpp3_(1.0)
167177roxcpp3_ <- function (x ) {
168- .Call(`_cpp11test_roxcpp3_` , x )
178+ .Call(`_cpp11test_roxcpp3_` , x )
169179}
170180
181+ # ' @title Roxygenise C++ function IV
182+ # ' @param x numeric value
183+ # ' @description Dummy function to test roxygen2. It adds 4.0 to a double.
184+ # ' @export
185+ # ' @examples roxcpp4_(1.0)
171186roxcpp4_ <- function (x ) {
172- .Call(`_cpp11test_roxcpp4_` , x )
187+ .Call(`_cpp11test_roxcpp4_` , x )
173188}
174189
190+ # ' @title Roxygenise C++ function V
191+ # ' @param x numeric value
192+ # ' @description Dummy function to test roxygen2. It adds 5.0 to a double.
193+ # ' @export
194+ # ' @examples roxcpp5_(1.0)
175195roxcpp5_ <- function (x ) {
176- .Call(`_cpp11test_roxcpp5_` , x )
196+ .Call(`_cpp11test_roxcpp5_` , x )
177197}
178198
179199notroxcpp6_ <- function (x ) {
180200 .Call(`_cpp11test_notroxcpp6_` , x )
181201}
182202
203+ # ' @title Roxygenise C++ function VII
204+ # ' @param x numeric value
205+ # ' @description Dummy function to test roxygen2. It adds 7.0 to a double.
206+ # ' @export
207+ # ' @examples
208+ # ' my_fun <- function(x) {
209+ # ' roxcpp7_(x)
210+ # ' }
211+ # ' @seealso \code{\link{roxcpp1_}}
183212roxcpp7_ <- function (x ) {
184- .Call(`_cpp11test_roxcpp7_` , x )
213+ .Call(`_cpp11test_roxcpp7_` , x )
185214}
186215
187216cpp11_safe_ <- function (x_sxp ) {
@@ -196,26 +225,6 @@ string_push_back_ <- function() {
196225 .Call(`_cpp11test_string_push_back_` )
197226}
198227
199- grow_strings_cpp11_ <- function (n , seed ) {
200- .Call(`_cpp11test_grow_strings_cpp11_` , n , seed )
201- }
202-
203- grow_strings_rcpp_ <- function (n , seed ) {
204- .Call(`_cpp11test_grow_strings_rcpp_` , n , seed )
205- }
206-
207- grow_strings_manual_ <- function (n , seed ) {
208- .Call(`_cpp11test_grow_strings_manual_` , n , seed )
209- }
210-
211- assign_cpp11_ <- function (n , seed ) {
212- .Call(`_cpp11test_assign_cpp11_` , n , seed )
213- }
214-
215- assign_rcpp_ <- function (n , seed ) {
216- .Call(`_cpp11test_assign_rcpp_` , n , seed )
217- }
218-
219228sum_dbl_for_ <- function (x ) {
220229 .Call(`_cpp11test_sum_dbl_for_` , x )
221230}
@@ -284,14 +293,6 @@ rcpp_push_and_truncate_ <- function(size_sxp) {
284293 .Call(`_cpp11test_rcpp_push_and_truncate_` , size_sxp )
285294}
286295
287- nullable_extptr_1 <- function () {
288- .Call(`_cpp11test_nullable_extptr_1` )
289- }
290-
291- nullable_extptr_2 <- function () {
292- .Call(`_cpp11test_nullable_extptr_2` )
293- }
294-
295296test_destruction_inner <- function () {
296297 invisible (.Call(`_cpp11test_test_destruction_inner` ))
297298}
0 commit comments