Below are some Frequently Asked Questions about cpp11. If you have a question that you think would fit well here please open an issue.
vector | element |
---|---|
cpp11::integers | int |
cpp11::doubles | double |
cpp11::logical | cpp11::r_bool |
cpp11::strings | cpp11::r_string |
cpp11::raws | uint8_t |
cpp11::list | SEXP |
Use the push_back()
method with the named literal syntax. The named literal syntax is defined in the cpp11::literals
namespace.
#include <cpp11.hpp>
[[cpp11::register]]
::list foo_push() {
cpp11using namespace cpp11::literals;
::writable::list x;
cpp11.push_back({"foo"_nm = 1});
x
return x;
}
cpp11 does not support default arguments, while convenient they would require more complexity to support than is currently worthwhile. If you need default argument support you can use a wrapper function around your cpp11 registered function. A common convention is to name the internal function with a trailing _
.
#include <cpp11.hpp>
[[cpp11::register]]
double add_some_(double x, double amount) {
return x + amount;
}
<- function(x, amount = 1) {
add_some add_some_(x, amount)
}add_some(1)
#> [1] 2
add_some(1, amount = 5)
#> [1] 6
Define a new writable list object.
cpp11::writable::list x;
Use the []
accessor function.
x["foo"]
Use the named()
method for vector classes.
#include <cpp11.hpp>
[[cpp11::register]]
bool is_named(cpp11::strings x) {
return x.named();
}
is_named("foo")
#> [1] FALSE
is_named(c(x = "foo"))
#> [1] TRUE
cpp11::writable::logicals
object with only a FALSE
value?You need to use list initialization with {}
to create the object.
#include <cpp11.hpp>
[[cpp11::register]]
::writable::logicals my_false() {
cpp11return {FALSE};
}
[[cpp11::register]]
::writable::logicals my_true() {
cpp11return {TRUE};
}
[[cpp11::register]]
::writable::logicals my_both() {
cpp11return {TRUE, FALSE, TRUE};
}
my_false()
#> [1] FALSE
my_true()
#> [1] TRUE
my_both()
#> [1] TRUE FALSE TRUE
To do this you need to call the base::new.env()
function from C++. This can be done by creating a cpp11::function
object and then calling it to generate the new environment.
#include <cpp11.hpp>
[[cpp11::register]]
::environment create_environment() {
cpp11::function new_env(cpp11::package("base")["new.env"]);
cpp11return new_env();
}
Use []
to retrieve or assign values from an environment by name. If a value does not exist it will return R_UnboundValue
.
#include <cpp11.hpp>
[[cpp11::register]]
bool foo_exists(cpp11::environment x) {
return x["foo"] != R_UnboundValue;
}
[[cpp11::register]]
void set_foo(cpp11::environment x, double value) {
["foo"] = value;
x}
<- new.env()
x
foo_exists(x)
#> [1] FALSE
set_foo(x, 1)
foo_exists(x)
#> [1] TRUE
cpp11:raws
from a std::string
?There is no built in way to do this. One method would be to push_back()
each element of the string individually.
#include <cpp11.hpp>
[[cpp11::register]]
::raws push_raws() {
cpp11std::string x("hi");
::writable::raws out;
cpp11
for (auto c : x) {
.push_back(c);
out}
return out;
}
push_raws()
#> [1] 68 69
std::string
from a cpp11::writable::string
?Because C++ does not allow for two implicit cast, explicitly cast to cpp11::r_string
first.
#include <cpp11.hpp>
#include <string>
[[cpp11::register]]
std::string my_string() {
::writable::strings x({"foo", "bar"});
cpp11std::string elt = cpp11::r_string(x[0]);
return elt;
}
The iterators are ::iterator
classes contained inside the vector classes. For example the iterator for cpp11::doubles
would be cpp11::doubles::iterator
and the iterator for cpp11::writable::doubles
would be cpp11::writable::doubles::iterator
.
using namespace std
, why do I still have to include std::
in the signatures of [[cpp11::register]]
functions?The using namespace std
directive will not be included in the generated code of the function signatures, so they still need to be fully qualified. However you will not need to qualify the type names within those functions.
The following won’t compile
#include <cpp11.hpp>
#include <string>
using namespace std;
[[cpp11::register]]
() {
string foobarreturn string("foo") + "-bar";
}
But this will compile and work as intended
#include <cpp11.hpp>
#include <string>
using namespace std;
[[cpp11::register]]
std::string foobar() {
return string("foo") + "-bar";
}
In place modification breaks the normal semantics of R code. In general it should be avoided, which is why cpp11::writable
classes always copy their data when constructed.
However if you are positive in-place modification is necessary for your use case you can use the move constructor to do this.
#include <cpp11.hpp>
[[cpp11::register]]
void add_one(cpp11::sexp x_sexp) {
::writable::integers x(std::move(x_sexp.data()));
cpp11for (auto&& value : x) {
++value;
}
}
<- c(1L, 2L, 3L, 4L)
x .Internal(inspect(x))
#> @7fbb980cbb88 13 INTSXP g0c2 [REF(2)] (len=4, tl=0) 1,2,3,4
add_one(x)
.Internal(inspect(x))
#> @7fbb980cbb88 13 INTSXP g0c2 [REF(6)] (len=4, tl=0) 2,3,4,5
x#> [1] 2 3 4 5