Skip to content

Commit

Permalink
use #' @exportS3Method base::as.function
Browse files Browse the repository at this point in the history
  • Loading branch information
dkahle committed Sep 27, 2024
1 parent 0cc1181 commit 968fa6e
Show file tree
Hide file tree
Showing 4 changed files with 10 additions and 10 deletions.
10 changes: 5 additions & 5 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -11,18 +11,18 @@ S3method("==",mpoly)
S3method("[",mpoly)
S3method("^",mpoly)
S3method("^",mpolyList)
S3method(as.function,bernstein)
S3method(as.function,bezier)
S3method(as.function,mpoly)
S3method(as.function,mpolyList)
S3method(as.mpoly,alm)
S3method(as.mpoly,default)
S3method(as.mpoly,lm)
S3method(as.mpoly,numeric)
S3method(as.mpoly,polynomial)
S3method(base::as.function,bernstein)
S3method(base::as.function,bezier)
S3method(base::as.function,mpoly)
S3method(base::as.function,mpolyList)
S3method(base::plot,mpoly)
S3method(coef,mpoly)
S3method(deriv,mpoly)
S3method(plot,mpoly)
S3method(print,mpoly)
S3method(print,mpolyList)
S3method(reorder,mpoly)
Expand Down
6 changes: 3 additions & 3 deletions R/as.function.R
Original file line number Diff line number Diff line change
Expand Up @@ -205,7 +205,7 @@
#' @usage \method{as.function}{mpoly}(x, varorder = vars(x), vector = TRUE,
#' silent = FALSE, ..., plus_pad = 1L, times_pad = 1L, squeeze = TRUE)
#' @rdname as-function
#' @export
#' @exportS3Method base::as.function
as.function.mpoly <- function(x, varorder = vars(x), vector = TRUE, silent = FALSE, ..., plus_pad = 1L, times_pad = 1L, squeeze = TRUE){

# argument checking
Expand Down Expand Up @@ -288,7 +288,7 @@ as.function.mpoly <- function(x, varorder = vars(x), vector = TRUE, silent = FAL


#' @rdname as-function
#' @export
#' @exportS3Method base::as.function
as.function.bernstein <- function(x, ...){

# grab bernstein values
Expand Down Expand Up @@ -350,7 +350,7 @@ as.function.bernstein <- function(x, ...){
#' @usage \method{as.function}{mpolyList}(x, varorder = vars(x), vector = TRUE,
#' silent = FALSE, name = FALSE, ..., plus_pad = 1L, times_pad = 1L, squeeze = TRUE)
#' @rdname as-function
#' @export
#' @exportS3Method base::as.function
as.function.mpolyList <- function(x, varorder = vars(x), vector = TRUE, silent = FALSE, name = FALSE, ..., plus_pad = 1L, times_pad = 1L, squeeze = TRUE){

# argument checking
Expand Down
2 changes: 1 addition & 1 deletion R/bezier.R
Original file line number Diff line number Diff line change
Expand Up @@ -331,7 +331,7 @@ bezierFunction <- function(...) {


#' @rdname as-function
#' @export
#' @exportS3Method base::as.function
as.function.bezier <- function(x, ...) bezier_function(attr(x, "bezier")$points, ...)


Expand Down
2 changes: 1 addition & 1 deletion R/plot.R
Original file line number Diff line number Diff line change
Expand Up @@ -14,7 +14,7 @@
#' @param ... arguments to pass to [contour()]
#' @usage \method{plot}{mpoly}(x, xlim, ylim, varorder, add = FALSE, n = 251, nx
#' = n, ny = n, f = 0.05, col = "#3366FF", ...)
#' @export
#' @exportS3Method base::plot
#' @return [NULL]
#' @examples
#'
Expand Down

0 comments on commit 968fa6e

Please sign in to comment.