if (!requireNamespace("BiocManager", quietly = TRUE)) {
install.packages("BiocManager")
}
BiocManager::install(c("ggbio", "GenomicRanges", "rtracklayer"))Bioconductor version 3.20 (BiocManager 1.30.25), R 4.4.2 (2024-10-31 ucrt)
Warning: package(s) not installed when version(s) same as or greater than current; use
`force = TRUE` to re-install: 'ggbio' 'GenomicRanges' 'rtracklayer'
Installation paths not writeable, unable to update packages
path: C:/Program Files/R/R-4.4.2/library
packages:
class, cluster, foreign, KernSmooth, MASS, nnet, rpart, spatial, survival
Old packages: 'bit64', 'Rcpp', 'rlang', 'SparseArray', 'xfun'
library(ggbio)Cargando paquete requerido: BiocGenerics
Adjuntando el paquete: 'BiocGenerics'
The following objects are masked from 'package:stats':
IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
anyDuplicated, aperm, append, as.data.frame, basename, cbind,
colnames, dirname, do.call, duplicated, eval, evalq, Filter, Find,
get, grep, grepl, intersect, is.unsorted, lapply, Map, mapply,
match, mget, order, paste, pmax, pmax.int, pmin, pmin.int,
Position, rank, rbind, Reduce, rownames, sapply, saveRDS, setdiff,
table, tapply, union, unique, unsplit, which.max, which.min
Cargando paquete requerido: ggplot2
Registered S3 method overwritten by 'GGally':
method from
+.gg ggplot2
Need specific help about ggbio? try mailing
the maintainer or visit https://lawremi.github.io/ggbio/
Adjuntando el paquete: 'ggbio'
The following objects are masked from 'package:ggplot2':
geom_bar, geom_rect, geom_segment, ggsave, stat_bin, stat_identity,
xlim
library(GenomicRanges)Cargando paquete requerido: stats4
Cargando paquete requerido: S4Vectors
Adjuntando el paquete: 'S4Vectors'
The following object is masked from 'package:utils':
findMatches
The following objects are masked from 'package:base':
expand.grid, I, unname
Cargando paquete requerido: IRanges
Adjuntando el paquete: 'IRanges'
The following object is masked from 'package:grDevices':
windows
Cargando paquete requerido: GenomeInfoDb
library(rtracklayer)