Skip to content

Commit

Permalink
fix Rd mark in concept
Browse files Browse the repository at this point in the history
  • Loading branch information
Yunuuuu committed Nov 14, 2024
1 parent abb5f43 commit c6fb354
Show file tree
Hide file tree
Showing 20 changed files with 51 additions and 51 deletions.
22 changes: 11 additions & 11 deletions R/alignpatch-inset.R
Original file line number Diff line number Diff line change
Expand Up @@ -83,7 +83,7 @@ patch.default <- function(x, ...) {
#' @inherit patch title description return
#' @inheritParams patch
#' @param ... Not used currently.
#' @family `patch` methods
#' @family patch methods
#' @export
patch.grob <- function(x, ...) {
x
Expand All @@ -99,7 +99,7 @@ patch.gList <- function(x, ...) {
#' @importFrom ggplot2 ggplotGrob
#' @inherit patch.grob
#' @seealso [ggplot][ggplot2::ggplot]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.ggplot <- function(x, ...) {
ggplotGrob(x)
Expand All @@ -110,23 +110,23 @@ patch.ggplot <- function(x, ...) {
#' - [`patch_titles()`]
#' - [`inset()`]
#' - [`ggwrap()`]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.patch_ggplot <- function(x, ...) {
ggalignGrob(x)
}

#' @inherit patch.grob
#' @seealso [`alignpatches`][align_plots]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.alignpatches <- function(x, ...) {
ggalignGrob(x)
}

#' @inherit patch.grob
#' @seealso [`patchwork`][patchwork::patchworkGrob]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.patchwork <- function(x, ...) {
rlang::check_installed("patchwork", "to make grob from patchwork")
Expand All @@ -135,7 +135,7 @@ patch.patchwork <- function(x, ...) {

#' @inherit patch.grob
#' @seealso [`patch`][patchwork::patchGrob]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.patch <- function(x, ...) {
rlang::check_installed("patchwork", "to make grob from patch")
Expand All @@ -146,7 +146,7 @@ patch.patch <- function(x, ...) {
#' @param ... Graphical Parameters passed on to [par()][graphics::par].
#' @inheritParams gridGraphics::echoGrob
#' @seealso [`plot()`]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.formula <- function(x, ..., device = NULL, name = NULL) {
rlang::check_installed("gridGraphics", "to make grob from base plot")
Expand Down Expand Up @@ -185,7 +185,7 @@ patch.function <- function(x, ..., device = NULL, name = NULL) {
#' @inherit patch.grob
#' @inheritParams gridGraphics::echoGrob
#' @seealso [`recordPlot()`][grDevices::recordPlot]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.recordedplot <- function(x, ..., device = NULL) {
rlang::check_installed("gridGraphics", "to make grob from recordedplot")
Expand All @@ -206,7 +206,7 @@ offscreen <- function(width, height) {
#' @inheritDotParams grid::grid.grabExpr -expr -device
#' @inheritParams grid::grid.grabExpr
#' @seealso [`trellis`][lattice::trellis.object]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.trellis <- function(x, ..., device = NULL) {
grid::grid.grabExpr(expr = print(x), ..., device = device %||% offscreen)
Expand All @@ -218,7 +218,7 @@ patch.trellis <- function(x, ..., device = NULL) {
#' @seealso
#' - [`Heatmap()`][ComplexHeatmap::Heatmap]
#' - [`HeatmapAnnotation()`][ComplexHeatmap::HeatmapAnnotation]
#' @family `patch` methods
#' @family patch methods
#' @importFrom utils getFromNamespace
#' @export
patch.Heatmap <- function(x, ..., device = NULL) {
Expand All @@ -243,6 +243,6 @@ patch.HeatmapAnnotation <- patch.HeatmapList

#' @inherit patch.grob
#' @seealso [`pheatmap()`][pheatmap::pheatmap]
#' @family `patch` methods
#' @family patch methods
#' @export
patch.pheatmap <- function(x, ...) .subset2(x, "gtable")
8 changes: 4 additions & 4 deletions R/fortify-data_frame.R
Original file line number Diff line number Diff line change
Expand Up @@ -20,7 +20,7 @@ fortify_data_frame <- function(data, ...) {
#' @description
#' By default, it calls [`fortify()`][ggplot2::fortify] to build the
#' data frame.
#' @family [`fortify_data_frame()`] methods
#' @family fortify_data_frame methods
#' @export
fortify_data_frame.default <- function(data, ...) {
ggplot2::fortify(model = data, ...)
Expand All @@ -34,7 +34,7 @@ fortify_data_frame.default <- function(data, ...) {
#' - `.names`: the names for the vector (only applicable if names exist).
#' - `value`: the actual value of the vector.
#'
#' @family [`fortify_data_frame()`] methods
#' @family fortify_data_frame methods
#' @export
fortify_data_frame.character <- function(data, ...) {
ans <- list(.names = vec_names(data), value = data)
Expand All @@ -43,7 +43,7 @@ fortify_data_frame.character <- function(data, ...) {
}

#' @inherit fortify_data_frame.character
#' @family [`fortify_data_frame()`] methods
#' @family fortify_data_frame methods
#' @export
fortify_data_frame.numeric <- fortify_data_frame.character

Expand All @@ -58,7 +58,7 @@ fortify_data_frame.NULL <- function(data, ...) data
#' When `data` is a matrix, it will automatically be transformed into a
#' long-form data frame, where each row represents a unique combination of
#' matrix indices and their corresponding values.
#' @family [`fortify_data_frame()`] methods
#' @family fortify_data_frame methods
#' @export
fortify_data_frame.matrix <- function(data, ...) {
row_nms <- vec_names(data)
Expand Down
4 changes: 2 additions & 2 deletions R/fortify-matrix.R
Original file line number Diff line number Diff line change
Expand Up @@ -17,7 +17,7 @@ fortify_matrix <- function(data, ...) {
#' @inherit fortify_matrix
#' @description
#' By default, it calls [`as.matrix()`] to build a matrix.
#' @family [`fortify_matrix()`] methods
#' @family fortify_matrix methods
#' @importFrom rlang try_fetch
#' @export
fortify_matrix.default <- function(data, ...) {
Expand Down Expand Up @@ -65,7 +65,7 @@ fortify_matrix.formula <- function(data, ...) rlang::as_function(data)
#' - `n_samples`: Total of samples
#' - `breaks`: factor levels of `Variant_Classification`, if `collapse_vars =
#' TRUE`, `"Multi_Hit"` will be added in the end.
#' @family [`fortify_matrix()`] methods
#' @family fortify_matrix methods
#' @export
fortify_matrix.MAF <- function(data, ..., genes = NULL, n_top = NULL,
remove_empty_samples = TRUE,
Expand Down
4 changes: 2 additions & 2 deletions man/fortify_data_frame.character.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/fortify_data_frame.default.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/fortify_data_frame.matrix.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/fortify_data_frame.numeric.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/fortify_matrix.MAF.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/fortify_matrix.default.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.Heatmap.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.alignpatches.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.formula.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.ggplot.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.grob.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.patch.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.patch_ggplot.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.patchwork.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.pheatmap.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.recordedplot.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/patch.trellis.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit c6fb354

Please sign in to comment.