774b21e0 |
#' @details The main plotting functions in this package are [plot_gene()] and [plot_region()].
#'
#' * See \code{vignette("UserGuide", package = "NanoMethViz")} for documentation of how to use this package.
#'
|
0fb29a3f |
#'
|
caadaa20 |
#' @docType package
|
ffbf02cf |
#'
|
4ff7d19e |
#' @importFrom dplyr %>%
|
fddf8b3c |
#' @importFrom methods new .valueClassTest is
|
ffbf02cf |
#' @importFrom rlang .data
|
9242ccb8 |
#' @importFrom readr read_tsv local_edition
|
ffbf02cf |
#' @importFrom ggplot2 aes geom_rect geom_segment geom_text ggplot theme_void
|
fddf8b3c |
#' xlim ylim ggplot_build rel unit geom_vline
#' @importFrom dplyr filter group_by ungroup inner_join mutate n select summarise case_when
|
ffbf02cf |
#' @importFrom tidyr unnest
#' @importFrom glue glue
|
2618b749 |
#' @importFrom assertthat assert_that is.readable is.writeable is.dir is.string
|
ffbf02cf |
#' @importFrom stringr str_extract
|
07599c65 |
#' @importFrom scales label_number cut_si
|
ffbf02cf |
#' @importFrom readr cols col_character col_integer col_logical col_double
|
fddf8b3c |
#' @importFrom tibble tibble as_tibble add_column
|
2618b749 |
#' @importFrom withr defer
|
cdbbd226 |
#' @importFrom R.utils gunzip
|
a9940e1a |
#' @importFrom utils read.delim
|
e6df221a |
#' @import cpp11
|
ffbf02cf |
#' @import patchwork
|
f3e14109 |
#' @import assertthat
|
0fb29a3f |
#' @import fs
|
fddf8b3c |
#' @import Rcpp
|
a7dcbf96 |
#' @useDynLib NanoMethViz
|
caadaa20 |
#' @keywords internal
"_PACKAGE"
# The following block is used by usethis to automatically manage
# roxygen namespace tags. Modify with care!
## usethis namespace: start
## usethis namespace: end
NULL
|