Code
(expect_error(my_function()))
Output
<error/vctrs_error_ptype2>
Error in `my_function()`:
! Can't combine `2` <double> and `chr()` <character>.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_cast>
Error in `my_function()`:
! Can't convert `2` <double> to <character>.
Code
(expect_error(my_function(df1, df2)))
Output
<error/vctrs_error_cast>
Error in `my_function()`:
! Can't convert `lhs$y` <logical> to match type of `y` <character>.
Code
(expect_error(my_function(df1, df2)))
Output
<error/vctrs_error_cast>
Error in `my_function()`:
! Can't convert `lhs$y` <logical> to match type of `y` <character>.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_cast_lossy>
Error in `my_function()`:
! Can't convert from `2` <double> to <logical> due to loss of precision.
* Locations: 1
Code
(expect_error(my_function()))
Output
<error/vctrs_error_incompatible_size>
Error in `my_function()`:
! Can't recycle input of size 2 to size 10.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_incompatible_size>
Error in `my_function()`:
! Can't recycle `..1` (size 2) to match `..2` (size 10).
Code
(expect_error(my_function()))
Output
<error/vctrs_error_unsupported>
Error in `dim<-`:
! `dim<-.vctrs_vctr()` not supported.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_unimplemented>
Error in `median()`:
! `median.vctrs_vctr()` not implemented.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_scalar_type>
Error in `my_function()`:
! `foobar()` must be a vector, not a <vctrs_foobar> object.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_assert_size>
Error in `my_function()`:
! `1:2` must have size 1, not size 2.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_cast_lossy>
Error in `my_function()`:
! Can't convert from `1.5` <double> to <integer> due to loss of precision.
* Locations: 1
Code
(expect_error(my_function()))
Output
<error/vctrs_error_cast_lossy>
Error in `my_function()`:
! Can't convert from `1.5` <double> to <logical> due to loss of precision.
* Locations: 1
Code
(expect_error(my_function()))
Output
<error/vctrs_error_cast_lossy>
Error in `my_function()`:
! Can't convert from `2L` <integer> to <logical> due to loss of precision.
* Locations: 1
Code
(expect_error(my_function()))
Output
<error/vctrs_error_cast>
Error in `my_function()`:
! Can't convert `matrix(TRUE)` <double[,1]> to <double>.
Can't decrease dimensionality from 2 to 1.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_cast_lossy>
Error in `my_function()`:
! Can't convert from `"a"` <character> to <factor<9b7e3>> due to loss of generality.
* Locations: 1
Code
(expect_error(my_function()))
Output
<error/vctrs_error_names_cannot_be_empty>
Error in `my_function()`:
! Names can't be empty.
x Empty name found at location 2.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_names_must_be_unique>
Error in `my_function()`:
! Names must be unique.
x These names are duplicated:
* "x" at locations 1 and 2.
i Use argument `repair` to specify repair strategy.
Code
(expect_error(my_function()))
Output
<error/vctrs_error_names_cannot_be_dot_dot>
Error in `my_function()`:
! Names can't be of the form `...` or `..j`.
x These names are invalid:
* "..." at location 1.
Code
(expect_error(my_function()))
Output
<error/rlang_error>
Error in `vctrs::num_as_location()`:
! `missing` must be one of "propagate", "remove", or "error".
Code
(expect_error(my_function()))
Output
<error/vctrs_error_subscript_oob>
Error in `my_function()`:
! Can't subset elements past the end.
i Location 10 doesn't exist.
i There are only 2 elements.
Code
(expect_error(my_function(1.5)))
Output
<error/vctrs_error_subscript_type>
Error in `my_function()`:
! Can't subset elements with `my_arg`.
x Can't convert from `my_arg` <double> to <integer> due to loss of precision.
Code
(expect_error(my_function(1.5)))
Output
<error/vctrs_error_subscript_type>
Error in `my_function()`:
! Can't subset elements.
x Can't convert from <double> to <integer> due to loss of precision.
Code
(expect_error(my_function(list())))
Output
<error/vctrs_error_subscript_type>
Error in `my_function()`:
! Can't subset elements with `my_arg`.
x `my_arg` must be logical, numeric, or character, not an empty list.
Code
(expect_error(my_function(1.5)))
Output
<error/vctrs_error_cast_lossy>
Error in `vec_as_location()`:
! Can't convert from `n` <double> to <integer> due to loss of precision.
* Locations: 1
Code
(expect_error(my_function(NA)))
Output
<error/vctrs_error_subscript_type>
Error in `my_function()`:
! Can't subset elements.
x Subscript can't contain missing values.
x It has a missing value at location 1.
vec_ptype()
reports correct error callCode
(expect_error(my_function(env())))
Output
<error/vctrs_error_scalar_type>
Error in `my_function()`:
! Input must be a vector, not an environment.
Code
(expect_error(my_function(foobar(list()))))
Output
<error/vctrs_error_scalar_type>
Error in `my_function()`:
! Input must be a vector, not a <vctrs_foobar> object.
vec_slice()
uses error_call
Code
(expect_error(my_function(env(), 1)))
Output
<error/vctrs_error_scalar_type>
Error in `my_function()`:
! `x` must be a vector, not an environment.
Code
(expect_error(my_function(1, 2)))
Output
<error/vctrs_error_subscript_oob>
Error in `my_function()`:
! Can't subset elements past the end.
i Location 2 doesn't exist.
i There is only 1 element.
Code
(expect_error(vec_slice(foobar(list()), 1)))
Output
<error/vctrs_error_scalar_type>
Error in `vec_slice()`:
! `x` must be a vector, not a <vctrs_foobar> object.
Code
(expect_error(vec_slice(list(), env())))
Output
<error/vctrs_error_subscript_type>
Error in `vec_slice()`:
! Can't subset elements with `i`.
x `i` must be logical, numeric, or character, not an environment.
Code
(expect_error(list_sizes(foobar(list()))))
Output
<error/rlang_error>
Error in `list_sizes()`:
! `x` must be a list, not a <vctrs_foobar> object.
Code
(expect_error(list_sizes(list(env()))))
Output
<error/vctrs_error_scalar_type>
Error in `list_sizes()`:
! `x[[1]]` must be a vector, not an environment.
Code
(expect_error(list_sizes(list(1, 2, env()))))
Output
<error/vctrs_error_scalar_type>
Error in `list_sizes()`:
! `x[[3]]` must be a vector, not an environment.
Code
(expect_error(list_sizes(list(1, 2, foo = env()))))
Output
<error/vctrs_error_scalar_type>
Error in `list_sizes()`:
! `x$foo` must be a vector, not an environment.
Code
(expect_error(vec_size(env())))
Output
<error/vctrs_error_scalar_type>
Error in `vec_size()`:
! `x` must be a vector, not an environment.
Code
(expect_error(my_function(my_arg = 1.5, .to = int())))
Output
<error/vctrs_error_cast_lossy>
Error in `my_function()`:
! Can't convert from `my_arg` <double> to <integer> due to loss of precision.
* Locations: 1
Code
(expect_error(my_function(my_arg = 1.5, .to = int(), .arg = "my_arg")))
Output
<error/vctrs_error_cast_lossy>
Error in `my_function()`:
! Can't convert from `my_arg$my_arg` <double> to <integer> due to loss of precision.
* Locations: 1
Code
(expect_error(my_function(this_arg = 1, that_arg = "foo", .arg = "my_arg")))
Output
<error/vctrs_error_ptype2>
Error in `my_function()`:
! Can't combine `my_arg$this_arg` <double> and `my_arg$that_arg` <character>.
Code
(expect_error(my_function(1, "foo", .arg = "my_arg")))
Output
<error/vctrs_error_ptype2>
Error in `my_function()`:
! Can't combine `my_arg[[1]]` <double> and `my_arg[[2]]` <character>.
Code
(expect_error(my_function(this_arg = x, that_arg = y)))
Output
<error/vctrs_error_ptype2>
Error in `my_function()`:
! Can't combine `this_arg$x` <character> and `that_arg$x` <double>.
Code
(expect_error(my_function(this_arg = 1, that_arg = "foo")))
Output
<error/vctrs_error_ptype2>
Error in `my_function()`:
! Can't combine `this_arg` <double> and `that_arg` <character>.
Code
(expect_error(my_function(this_arg = 1, that_arg = "foo", .arg = "my_arg")))
Output
<error/vctrs_error_ptype2>
Error in `my_function()`:
! Can't combine `my_arg$this_arg` <double> and `my_arg$that_arg` <character>.
Code
(expect_error(my_function(1, "foo", .arg = "my_arg")))
Output
<error/vctrs_error_ptype2>
Error in `my_function()`:
! Can't combine `my_arg[[1]]` <double> and `my_arg[[2]]` <character>.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.