From 586a47837b9c3743ec1ee8f1717f0078ff2c5f42 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Ma=C3=ABlle=20Salmon?= Date: Fri, 7 Jul 2023 08:56:09 +0200 Subject: [PATCH] fix: CRAN comments --- DESCRIPTION | 3 ++- R/relational-expr.R | 5 +++++ man/expr.Rd | 11 +++++++++++ 3 files changed, 18 insertions(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index a1bcbd96..1d67a876 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -10,7 +10,8 @@ Authors@R: c( person("Posit Software, PBC", role = c("cph", "fnd")) ) Description: Defines a set of generics that provide a low-level - implementer's interface for dplyr's high-level user interface. + implementer's interface for the high-level user interface of + 'dplyr'. License: MIT + file LICENSE URL: https://github.com/krlmlr/duckplyr, https://krlmlr.github.io/duckplyr/ BugReports: https://github.com/krlmlr/duckplyr/issues diff --git a/R/relational-expr.R b/R/relational-expr.R index 1696ffb2..3ef65294 100644 --- a/R/relational-expr.R +++ b/R/relational-expr.R @@ -13,6 +13,7 @@ #' @param class Classes added in front of the `"relational_relexpr"` base class. #' #' @name expr +#' @return an object of class `"relational_relexpr"` #' @export #' @examples #' relexpr_set_alias(alias = "my_predicate", @@ -35,6 +36,7 @@ new_relexpr <- function(x, class = NULL) { #' @param rel The name of the relation to reference. #' @param alias An alias for the new expression. #' @rdname expr +#' @return an object of class `"relational_relexpr"` #' @export relexpr_reference <- function(name, rel = NULL, alias = NULL) { stopifnot(is_string(name)) @@ -49,6 +51,7 @@ relexpr_reference <- function(name, rel = NULL, alias = NULL) { #' #' @param val The value to use in the constant expression. #' @rdname expr +#' @return an object of class `"relational_relexpr"` #' @export relexpr_constant <- function(val, alias = NULL) { stopifnot(length(val) == 1) @@ -63,6 +66,7 @@ relexpr_constant <- function(val, alias = NULL) { #' #' @param args Function arguments, a list of `expr` objects. #' @rdname expr +#' @return an object of class `"relational_relexpr"` #' @export relexpr_function <- function(name, args, alias = NULL) { stopifnot(is_string(name)) @@ -77,6 +81,7 @@ relexpr_function <- function(name, args, alias = NULL) { #' #' @param expr An `expr` object. #' @rdname expr +#' @return an object of class `"relational_relexpr"` #' @export relexpr_set_alias <- function(expr, alias = NULL) { stopifnot(inherits(expr, "relational_relexpr")) diff --git a/man/expr.Rd b/man/expr.Rd index 230ef96c..05cdfbfe 100644 --- a/man/expr.Rd +++ b/man/expr.Rd @@ -36,6 +36,17 @@ relexpr_set_alias(expr, alias = NULL) \item{expr}{An \code{expr} object.} } +\value{ +an object of class \code{"relational_relexpr"} + +an object of class \code{"relational_relexpr"} + +an object of class \code{"relational_relexpr"} + +an object of class \code{"relational_relexpr"} + +an object of class \code{"relational_relexpr"} +} \description{ These functions provide a backend-agnostic way to construct expression trees built of column references, constants, and functions.