Releases: tidyverse/tibble
tibble 3.2.1
Internal
- Use symbol instead of string in
.Call()
.
tibble 3.2.0
Features
-
Accurate location of the source of an error in error messages (#1379, #1065, #1508).
-
as_data_frame()
now also refers toas.data.frame()
in its deprecation message (#1149, #1506).
Breaking changes
-
Deprecated functions and arguments where we could not detect usage by other CRAN packages (#1515):
-
data_frame_()
,lst_()
,frame_data()
-
as_tibble(validate = )
,as_tibble(NULL)
,new_tibble(subclass = )
-
add_row()
andadd_column()
for non-data-frame input -
add_column()
for input with non-unique names -
corner cases for
tbl[[x]]
-
-
Breaking change: Remove
knit_print.trunc_mat()
method (#1516). -
Forward
trunc_mat()
to new-style pillar methods (#1517).
Bug fixes
Performance
- Reduce overhead of single-column subset assignment (#1363).
Documentation
-
Update example for
nrow
argument tonew_tibble()
(@heavywatal, #1394). -
Fix display of mermaid diagrams in
vignette("formats")
(@maelle, #1497, #1498). -
Remove ANSI escapes from invariants article on pkgdown (#1374).
Internal
-
Require vctrs >= 0.4.1 and pillar >= 1.8.1
-
Use cli for formatting conditions (#1387).
-
Use
vec_as_location(missing = "error")
for better error messages (#741, #1511). -
Remove compatibility code for RSDA package which is broken anyway due to other changes (#923, #1509).
-
Skip tests if suggested packages not available (#1246, @MichaelChirico).
-
Remove obsolete tests (#1513).
tibble 3.1.8
tibble 3.1.7
Breaking change
trunc_mat()
now returns a value with a different structure. This is considered an implementation detail that can change in the future, do not rely on it. The only guarantee is that callingprint()
will display the input like a tibble (#1059).
Documentation
- Avoid listing
dim_desc()
in reexports. - Add more examples for data frame and matrix columns (#978, #1012).
Internal
tibble 3.1.6
set_num_opts()
andset_char_opts()
are reexported from pillar (#959).view()
usesrlang::expr_deparse(width = Inf)
to avoid errors with long|>
pipes (#957).new_tibble()
checks that thenrow
argument is nonnegative and less than 2^31 (#916).tbl_sum.tbl_df()
has an ellipsis in its formals for extensibility.
tibble 3.1.5
- Avoid necessity to set
"tibble.view_max"
option for lazy tables (#954). - Avoid blanket import for lifecycle package for compatibility with upcoming rlang (#955, @romainfrancois).
tibble 3.1.4
Features
as.data.frame.tbl_df()
strips inner column names (#837).new_tibble()
allows omitting thenrow
argument again (#781).
Documentation
- Move
vignette("digits")
,vignette("numbers")
,?num
and?char
from the pillar package here (#913). - Replace
iris
bytrees
(#943). - Various documentation improvements.
- New
?tibble_options
help page (#912).
Performance
x[i, j] <- one_row_value
avoids explicit recycling of the right-hand side, the recycling happens implicitly invctrs::vec_assign()
for performance (#922).
Internal
- Vignettes are now tested with a snapshot test (#919).
new_tibble()
usesvctrs::new_data_frame()
internally (#726, @DavisVaughan).- Adapt to pillar 1.6.2.
- Fix tests for compatibility with pillar 1.6.2.
tibble 3.1.3
Bug fixes
tbl[row, col] <- rhs
treats an all-NA
logical vector as a missing value both for existing data (#773) and for the right-hand side value (#868). This means that a column initialized withNA
(of typelogical
) will change its type when a row is updated to a value of a different type.[[<-()
supports symbols (#893).
Features
as_tibble_row()
supports arbitrary vectors (#797).enframe()
anddeframe()
support arbitrary vectors (#730).tibble()
andtibble_row()
ignore all columns that evaluate toNULL
, not only those where a verbatimNULL
is passed (#895, #900).new_tibble()
is now faster (#901, @mgirlich).
Internal
tibble 3.1.2
- Bump required versions of ellipsis and vctrs to avoid warning during package load.
tibble 3.1.1
num()
andchar()
are reexported from pillar (#880).tribble()
andframe_matrix()
give an error if values are named (#871, @lorenzwalthert).- Document
cli.num_colors
option (#410). - Fix
new_tibble()
examples for compatibility with pillar 1.6.0.