Skip to content

Releases: r-lib/zeallot

winning duende

03 Jun 13:36
Compare
Choose a tag to compare

summary

  • Bumped to stable version.
  • Removed outdate language in the unpacking assignment vignette. (#36)
  • Destructuring objects with multiple classes will no longer raise a
    warning. (#35)

left-hand side of darkness

06 Sep 16:48
Compare
Choose a tag to compare

summary

  • The left-hand side may now contain calls to [[, [, and $ allowing
    assignment of parts of objects. The parent object must already
    exist, otherwise an error is raised. Thank you to @rafaqz for the suggestion. (#32)

to the right, to the right

25 Aug 14:49
Compare
Choose a tag to compare

summary

  • The bracket and colon syntax has been completely removed, users will now see
    an "unexpected call {" error message when attempting to use the old syntax.
    Please use the c() name structure syntax.

  • A %->% operator has been added. The right operator performs the same
    operation as %<-% with the name structure on the right-hand side and
    the values to assign on the left-hand side. This is particularly useful as
    the left operator did not work well with %>% chains.

  • = may be used to specify the default value of a variable. A default value
    is used when there are an insufficient number of values.

simpler, lighter, stronger

28 Jul 17:47
Compare
Choose a tag to compare

summary

  • The bracket and colon syntax has been deprecated in favor of a lighter syntax.
    Documentation has been updated accordingly, see docs for more
    information about the new syntax. Using the old syntax will raise a warning
    and will be removed in future versions of zeallot. Thank you to @hadley for
    the suggestion. (#21)
  • %<-% can now be used for regular assignment. (#17)
  • ... can now be used to skip multiple values without assigning those values
    and is now recommended over the previously suggested ..... (#18)
  • massign() is no longer exported.

syntax

  • c(a, b) %<-% c(0, 1)
  • c(a, b) %<-% list(0, 1)
  • c(a, c(b, d)) %<-% list(0, list(1, 2))
  • c(a, c(b, d)) %<-% data.frame(x = 1:5, y = 6:10, z = 11:15)

bug fixes

  • Numerics on left-hand side are no longer unintentionally quoted and will now
    raise an error. (#20)
  • Language objects on left-hand side are no longer treated as symbols and will
    now raise an error. (#20)

vector to shining vector

27 Feb 16:54
Compare
Choose a tag to compare

summary

  • documentation and examples now consistently put space around colons, e.g. a : b instead of a: b
  • additional minor updates to the README and man pages

bug fixes

  • when unpacking a vector of values collector variables now collect values as a vector, previously values were collected as a list (#14)

initial CRAN release

28 Jan 21:46
Compare
Choose a tag to compare

summary

  • all functionality is the same as v0.0.1
  • cleaned up README.md, NEWS.md, fixed .Rbuildignore
  • submitted to CRAN

initial release

23 Jan 14:06
Compare
Choose a tag to compare

summary

  • not on CRAN
  • %<-% operator
  • name syntax using : and {

syntax

  • a: b %<-% c(0, 1)
  • {a: b} %<-% list(0, 1)
  • {a: {b: c}} %<-% list(0, list(1, 2))
  • {a: b: c} %<-% data.frame(x = 1:5, y = 6:10, z = 11:15)

vignettes

  • introduction to unpacking assignment