@@ -331,7 +331,8 @@ tbl[[1:2]]
331331
332332``` r
333333df [[c(" n" , " c" )]]
334- # > Error in .subset2(x, i, exact = exact): subscript out of bounds
334+ # > Error in `.subset2()`:
335+ # > ! subscript out of bounds
335336```
336337
337338</td ><td >
@@ -363,7 +364,8 @@ tbl[[TRUE]]
363364
364365``` r
365366df [[mean ]]
366- # > Error in .subset2(x, i, exact = exact): invalid subscript type 'closure'
367+ # > Error in `.subset2()`:
368+ # > ! invalid subscript type 'closure'
367369```
368370
369371</td ><td >
@@ -431,7 +433,8 @@ tbl[[NA_integer_]]
431433
432434``` r
433435df [[- 1 ]]
434- # > Error in .subset2(x, i, exact = exact): invalid negative subscript in get1index <real>
436+ # > Error in `.subset2()`:
437+ # > ! invalid negative subscript in get1index <real>
435438```
436439
437440</td ><td >
@@ -447,7 +450,8 @@ tbl[[-1]]
447450
448451``` r
449452df [[4 ]]
450- # > Error in .subset2(x, i, exact = exact): subscript out of bounds
453+ # > Error in `.subset2()`:
454+ # > ! subscript out of bounds
451455```
452456
453457</td ><td >
@@ -982,7 +986,8 @@ For compatibility, `i` can also be a character vector containing positive number
982986
983987``` r
984988df [mean , ]
985- # > Error in xj[i]: invalid subscript type 'closure'
989+ # > Error in `xj[i]`:
990+ # > ! invalid subscript type 'closure'
986991```
987992
988993</td ><td >
@@ -998,7 +1003,8 @@ tbl[mean, ]
9981003
9991004``` r
10001005df [list (1 ), ]
1001- # > Error in xj[i]: invalid subscript type 'list'
1006+ # > Error in `xj[i]`:
1007+ # > ! invalid subscript type 'list'
10021008```
10031009
10041010</td ><td >
@@ -1473,7 +1479,8 @@ with_tbl(tbl[[TRUE]] <- 0)
14731479
14741480``` r
14751481with_df(df [[1 : 3 ]] <- 0 )
1476- # > Error in `[[<-`(`*tmp*`, i, value = value): recursive indexing failed at level 2
1482+ # > Error in `[[<-`:
1483+ # > ! recursive indexing failed at level 2
14771484```
14781485
14791486</td ><td >
@@ -1489,7 +1496,8 @@ with_tbl(tbl[[1:3]] <- 0)
14891496
14901497``` r
14911498with_df(df [[c(" n" , " c" )]] <- 0 )
1492- # > Error in x[[i]] <- value: more elements supplied than there are to replace
1499+ # > Error in `x[[i]] <- value`:
1500+ # > ! more elements supplied than there are to replace
14931501```
14941502
14951503</td ><td >
@@ -1505,7 +1513,8 @@ with_tbl(tbl[[c("n", "c")]] <- 0)
15051513
15061514``` r
15071515with_df(df [[FALSE ]] <- 0 )
1508- # > Error in x[[i]] <- value: attempt to select less than one element in integerOneIndex
1516+ # > Error in `x[[i]] <- value`:
1517+ # > ! attempt to select less than one element in integerOneIndex
15091518```
15101519
15111520</td ><td >
@@ -1521,7 +1530,8 @@ with_tbl(tbl[[FALSE]] <- 0)
15211530
15221531``` r
15231532with_df(df [[1 : 2 ]] <- 0 )
1524- # > Error in x[[i]] <- value: more elements supplied than there are to replace
1533+ # > Error in `x[[i]] <- value`:
1534+ # > ! more elements supplied than there are to replace
15251535```
15261536
15271537</td ><td >
@@ -1537,7 +1547,8 @@ with_tbl(tbl[[1:2]] <- 0)
15371547
15381548``` r
15391549with_df(df [[NA_integer_ ]] <- 0 )
1540- # > Error in x[[i]] <- value: attempt to select more than one element in integerOneIndex
1550+ # > Error in `x[[i]] <- value`:
1551+ # > ! attempt to select more than one element in integerOneIndex
15411552```
15421553
15431554</td ><td >
@@ -1553,7 +1564,8 @@ with_tbl(tbl[[NA_integer_]] <- 0)
15531564
15541565``` r
15551566with_df(df [[NA ]] <- 0 )
1556- # > Error in x[[i]] <- value: attempt to select more than one element in integerOneIndex
1567+ # > Error in `x[[i]] <- value`:
1568+ # > ! attempt to select more than one element in integerOneIndex
15571569```
15581570
15591571</td ><td >
@@ -1569,7 +1581,8 @@ with_tbl(tbl[[NA]] <- 0)
15691581
15701582``` r
15711583with_df(df [[NA_character_ ]] <- 0 )
1572- # > Error in if (names(x)[nc] == "") names(x)[nc] <- paste0("V", nc): missing value where TRUE/FALSE needed
1584+ # > Error in `if (names(x)[nc] == "") ...`:
1585+ # > ! missing value where TRUE/FALSE needed
15731586```
15741587
15751588</td ><td >
@@ -1615,7 +1628,8 @@ with_tbl(tbl[["li"]] <- list(0))
16151628
16161629``` r
16171630with_df2(df2 [[" tb" ]] <- df [1 , ])
1618- # > Error in `[[<-.data.frame`(`*tmp*`, "tb", value = structure(list(n = 1L, : replacement has 1 row, data has 4
1631+ # > Error in `[[<-.data.frame`:
1632+ # > ! replacement has 1 row, data has 4
16191633```
16201634
16211635</td ><td >
@@ -1636,7 +1650,8 @@ with_tbl2(tbl2[["tb"]] <- tbl[1, ])
16361650
16371651``` r
16381652with_df2(df2 [[" m" ]] <- df2 [[" m" ]][1 , , drop = FALSE ])
1639- # > Error in `[[<-.data.frame`(`*tmp*`, "m", value = structure(c(1, 0, 0, : replacement has 1 row, data has 4
1653+ # > Error in `[[<-.data.frame`:
1654+ # > ! replacement has 1 row, data has 4
16401655```
16411656
16421657</td ><td >
@@ -1707,7 +1722,8 @@ with_tbl(tbl[[1]] <- 4:1)
17071722
17081723``` r
17091724with_df(df [[1 ]] <- 3 : 1 )
1710- # > Error in `[[<-.data.frame`(`*tmp*`, 1, value = 3:1): replacement has 3 rows, data has 4
1725+ # > Error in `[[<-.data.frame`:
1726+ # > ! replacement has 3 rows, data has 4
17111727```
17121728
17131729</td ><td >
@@ -2309,7 +2325,8 @@ An attempt to update the same column twice gives an error.
23092325
23102326``` r
23112327with_df(df [c(1 , 1 )] <- list (1 , 2 ))
2312- # > Error in `[<-.data.frame`(`*tmp*`, c(1, 1), value = list(1, 2)): duplicate subscripts for columns
2328+ # > Error in `[<-.data.frame`:
2329+ # > ! duplicate subscripts for columns
23132330```
23142331
23152332</td ><td >
@@ -2356,7 +2373,8 @@ with_tbl(tbl[1:2] <- list(NULL, 4:1))
23562373
23572374``` r
23582375with_df(df [NA ] <- list (" x" ))
2359- # > Error in `[<-.data.frame`(`*tmp*`, NA, value = list("x")): missing values are not allowed in subscripted assignments of data frames
2376+ # > Error in `[<-.data.frame`:
2377+ # > ! missing values are not allowed in subscripted assignments of data frames
23602378```
23612379
23622380</td ><td >
@@ -2373,7 +2391,8 @@ with_tbl(tbl[NA] <- list("x"))
23732391
23742392``` r
23752393with_df(df [NA_integer_ ] <- list (" x" ))
2376- # > Error in `[<-.data.frame`(`*tmp*`, NA_integer_, value = list("x")): missing values are not allowed in subscripted assignments of data frames
2394+ # > Error in `[<-.data.frame`:
2395+ # > ! missing values are not allowed in subscripted assignments of data frames
23772396```
23782397
23792398</td ><td >
@@ -2388,7 +2407,8 @@ with_tbl(tbl[NA_integer_] <- list("x"))
23882407
23892408``` r
23902409with_df(df [NA_character_ ] <- list (" x" ))
2391- # > Error in `[<-.data.frame`(`*tmp*`, NA_character_, value = list("x")): missing values are not allowed in subscripted assignments of data frames
2410+ # > Error in `[<-.data.frame`:
2411+ # > ! missing values are not allowed in subscripted assignments of data frames
23922412```
23932413
23942414</td ><td >
@@ -2610,7 +2630,8 @@ with_tbl(tbl[4] <- list(4:1))
26102630
26112631``` r
26122632with_df(df [5 ] <- list (4 : 1 ))
2613- # > Error in `[<-.data.frame`(`*tmp*`, 5, value = list(4:1)): new columns would leave holes after existing columns
2633+ # > Error in `[<-.data.frame`:
2634+ # > ! new columns would leave holes after existing columns
26142635```
26152636
26162637</td ><td >
@@ -3004,7 +3025,8 @@ with_tbl(tbl[, 2:3] <- NULL)
30043025
30053026``` r
30063027with_df(df [1 , 2 : 3 ] <- NULL )
3007- # > Error in x[[jj]][iseq] <- vjj: replacement has length zero
3028+ # > Error in `x[[jj]][iseq] <- vjj`:
3029+ # > ! replacement has length zero
30083030```
30093031
30103032</td ><td >
@@ -3027,7 +3049,8 @@ See `?vec_is` and `?vec_proxy` for details.
30273049
30283050``` r
30293051with_df(df [1 ] <- mean )
3030- # > Error in rep(value, length.out = n): attempt to replicate an object of type 'closure'
3052+ # > Error in `rep()`:
3053+ # > ! attempt to replicate an object of type 'closure'
30313054```
30323055
30333056</td ><td >
@@ -3066,7 +3089,8 @@ with_df(df[1] <- lm(mpg ~ wt, data = mtcars))
30663089# > c(`(Intercept)` = 37.285126167342,
30673090# > : replacement element 7 has 5 rows
30683091# > to replace 4 rows
3069- # > Error in `[<-.data.frame`(`*tmp*`, 1, value = structure(list(coefficients = c(`(Intercept)` = 37.285126167342, : replacement element 10 has 3 rows, need 4
3092+ # > Error in `[<-.data.frame`:
3093+ # > ! replacement element 10 has 3 rows, need 4
30703094```
30713095
30723096</td ><td >
@@ -3207,7 +3231,8 @@ with_tbl(tbl[-2, ] <- tbl[1, ])
32073231
32083232``` r
32093233with_df(df [- 1 : 2 , ] <- df [1 , ])
3210- # > Error in seq_len(nrows)[i]: only 0's may be mixed with negative subscripts
3234+ # > Error in `seq_len(nrows)[i]`:
3235+ # > ! only 0's may be mixed with negative subscripts
32113236```
32123237
32133238</td ><td >
@@ -3224,7 +3249,8 @@ with_tbl(tbl[-1:2, ] <- tbl[1, ])
32243249
32253250``` r
32263251with_df(df [NA_integer_ , ] <- df [1 , ])
3227- # > Error in `[<-.data.frame`(`*tmp*`, NA_integer_, , value = structure(list(: missing values are not allowed in subscripted assignments of data frames
3252+ # > Error in `[<-.data.frame`:
3253+ # > ! missing values are not allowed in subscripted assignments of data frames
32283254```
32293255
32303256</td ><td >
@@ -3241,7 +3267,8 @@ with_tbl(tbl[NA_integer_, ] <- tbl[1, ])
32413267
32423268``` r
32433269with_df2(df2 [NA_integer_ , ] <- df2 [1 , ])
3244- # > Error in `[<-.data.frame`(`*tmp*`, NA_integer_, , value = structure(list(: missing values are not allowed in subscripted assignments of data frames
3270+ # > Error in `[<-.data.frame`:
3271+ # > ! missing values are not allowed in subscripted assignments of data frames
32453272```
32463273
32473274</td ><td >
@@ -3306,7 +3333,8 @@ with_tbl(tbl[FALSE, ] <- tbl[1, ])
33063333
33073334``` r
33083335with_df(df [NA , ] <- df [1 , ])
3309- # > Error in `[<-.data.frame`(`*tmp*`, NA, , value = structure(list(n = 1L, : missing values are not allowed in subscripted assignments of data frames
3336+ # > Error in `[<-.data.frame`:
3337+ # > ! missing values are not allowed in subscripted assignments of data frames
33103338```
33113339
33123340</td ><td >
@@ -3375,7 +3403,8 @@ with_tbl(tbl[2:3, ] <- list(tbl$n[1], tbl$c[1:2], tbl$li[1]))
33753403
33763404``` r
33773405with_df(df [2 : 4 , ] <- df [1 : 2 , ])
3378- # > Error in `[<-.data.frame`(`*tmp*`, 2:4, , value = structure(list(n = c(1L, : replacement element 1 has 2 rows, need 3
3406+ # > Error in `[<-.data.frame`:
3407+ # > ! replacement element 1 has 2 rows, need 3
33793408```
33803409
33813410</td ><td >
@@ -3397,7 +3426,8 @@ with_tbl(tbl[2:4, ] <- tbl[1:2, ])
33973426
33983427``` r
33993428with_df2(df2 [2 : 4 , ] <- df2 [1 , ])
3400- # > Error in `[<-.data.frame`(`*tmp*`, 2:4, , value = structure(list(tb = structure(list(: replacement element 1 is a matrix/data frame of 1 row, need 3
3429+ # > Error in `[<-.data.frame`:
3430+ # > ! replacement element 1 is a matrix/data frame of 1 row, need 3
34013431```
34023432
34033433</td ><td >
@@ -3418,7 +3448,8 @@ with_tbl2(tbl2[2:4, ] <- tbl2[1, ])
34183448
34193449``` r
34203450with_df2(df2 [2 : 4 , ] <- df2 [2 : 3 , ])
3421- # > Error in `[<-.data.frame`(`*tmp*`, 2:4, , value = structure(list(tb = structure(list(: replacement element 1 is a matrix/data frame of 2 rows, need 3
3451+ # > Error in `[<-.data.frame`:
3452+ # > ! replacement element 1 is a matrix/data frame of 2 rows, need 3
34223453```
34233454
34243455</td ><td >
@@ -3688,7 +3719,8 @@ with_tbl(tbl[as.character(-(3:5)), ] <- tbl[1, ])
36883719
36893720``` r
36903721with_df(df [NA_character_ , ] <- df [1 , ])
3691- # > Error in `[<-.data.frame`(`*tmp*`, NA_character_, , value = structure(list(: missing values are not allowed in subscripted assignments of data frames
3722+ # > Error in `[<-.data.frame`:
3723+ # > ! missing values are not allowed in subscripted assignments of data frames
36923724```
36933725
36943726</td ><td >
@@ -3981,7 +4013,8 @@ with_tbl(tbl[2:3, "x"] <- 1)
39814013
39824014``` r
39834015with_df(df [2 : 3 , " n" ] <- NULL )
3984- # > Error in x[[jj]][iseq] <- vjj: replacement has length zero
4016+ # > Error in `x[[jj]][iseq] <- vjj`:
4017+ # > ! replacement has length zero
39854018```
39864019
39874020</td ><td >
@@ -4134,7 +4167,8 @@ with_tbl(tbl[1, ][[3]] <- list(NULL))
41344167
41354168``` r
41364169with_df2(df2 [[1 , 1 ]] <- df [1 , ])
4137- # > Error in `[[<-.data.frame`(`*tmp*`, iseq, value = structure(list(n = 1L, : replacement has 1 row, data has 4
4170+ # > Error in `[[<-.data.frame`:
4171+ # > ! replacement has 1 row, data has 4
41384172```
41394173
41404174</td ><td >
@@ -4185,7 +4219,8 @@ with_tbl2(tbl2[1, ][[1]] <- tbl[1, ])
41854219
41864220``` r
41874221with_df2(df2 [[1 , 2 ]] <- t(1 : 4 ))
4188- # > Error in x[[jseq]][[iseq]] <- value: more elements supplied than there are to replace
4222+ # > Error in `x[[jseq]][[iseq]] <- value`:
4223+ # > ! more elements supplied than there are to replace
41894224```
41904225
41914226</td ><td >
@@ -4236,7 +4271,8 @@ with_tbl2(tbl2[1, ][[2]] <- t(1:4))
42364271
42374272``` r
42384273df [[1 : 2 , 1 ]]
4239- # > Error in col[[i, exact = exact]]: attempt to select more than one element in vectorIndex
4274+ # > Error in `col[[i, exact = exact]]`:
4275+ # > ! attempt to select more than one element in vectorIndex
42404276```
42414277
42424278</td ><td >
@@ -4252,7 +4288,8 @@ tbl[[1:2, 1]]
42524288
42534289``` r
42544290with_df(df [[1 : 2 , 1 ]] <- 0 )
4255- # > Error in `[[<-.data.frame`(`*tmp*`, 1:2, 1, value = 0): only a single element should be replaced
4291+ # > Error in `[[<-.data.frame`:
4292+ # > ! only a single element should be replaced
42564293```
42574294
42584295</td ><td >
0 commit comments