iSEEindex 1.5.0
First, let us set up the core elements of a simple application (see ?iSEEindex
).
library("BiocFileCache")
##
# BiocFileCache ----
##
library(BiocFileCache)
bfc <- BiocFileCache(cache = tempdir())
##
# iSEEindex ----
##
dataset_fun <- function() {
x <- yaml::read_yaml(system.file(package = "iSEEindex", "example.yaml"))
x$datasets
}
initial_fun <- function() {
x <- yaml::read_yaml(system.file(package = "iSEEindex", "example.yaml"))
x$initial
}
Then, we design header and footer content, each wrapped in a shiny::fluidRow()
.
library("shiny")
header <- fluidRow(shinydashboard::box(width = 12L,
column(width = 10,
p(strong("Welcome to this demonstration app!")),
p(
"This is an example header that demonstrate how to use the functionality.",
"A great place for branding and intros.",
),
p("On the right, we demonstrate how other content such as images can be added to this header.")
),
column(width = 2, img(src="www/iSEE.png", width = "100px", height = "120px"))
))
footer <- fluidRow(shinydashboard::box(width = 12L,
p("This is a example footer. A great place for copyright statements and outros.", style="text-align: center;"),
p(
"© 2023 iSEE.",
a("Artistic-2.0", href = "https://opensource.org/license/artistic-2-0/"),
style="text-align: center;")
))
For the image file to be found, the containing directory must be added to the Shiny resource path as follows:
library("shiny")
addResourcePath("www", system.file(package = "iSEEindex"))
Finally, we supply the custom header and footer to iSEEindex()
.
library("iSEEindex")
app <- iSEEindex(bfc, dataset_fun, initial_fun,
body.header = header, body.footer = footer
)
if (interactive()) {
shiny::runApp(app, port = 1234)
}
The iSEEindex package (Rue-Albrecht and Marini, 2024) was made possible thanks to:
This package was developed using biocthis.
Code for creating the vignette
## Create the vignette
library("rmarkdown")
system.time(render("header.Rmd", "BiocStyle::html_document"))
## Extract the R code
library("knitr")
knit("header.Rmd", tangle = TRUE)
Date the vignette was generated.
#> [1] "2024-10-29 18:00:29 EDT"
Wallclock time spent generating the vignette.
#> Time difference of 10.666 secs
R
session information.
#> ─ Session info ───────────────────────────────────────────────────────────────────────────────────
#> setting value
#> version R Under development (unstable) (2024-10-21 r87258)
#> os Ubuntu 24.04.1 LTS
#> system x86_64, linux-gnu
#> ui X11
#> language (EN)
#> collate C
#> ctype en_US.UTF-8
#> tz America/New_York
#> date 2024-10-29
#> pandoc 3.1.3 @ /usr/bin/ (via rmarkdown)
#>
#> ─ Packages ───────────────────────────────────────────────────────────────────────────────────────
#> package * version date (UTC) lib source
#> abind 1.4-8 2024-09-12 [2] CRAN (R 4.5.0)
#> backports 1.5.0 2024-05-23 [2] CRAN (R 4.5.0)
#> bibtex 0.5.1 2023-01-26 [2] CRAN (R 4.5.0)
#> Biobase * 2.67.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> BiocFileCache * 2.15.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> BiocGenerics * 0.53.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> BiocManager 1.30.25 2024-08-28 [2] CRAN (R 4.5.0)
#> BiocStyle * 2.35.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> bit 4.5.0 2024-09-20 [2] CRAN (R 4.5.0)
#> bit64 4.5.2 2024-09-22 [2] CRAN (R 4.5.0)
#> blob 1.2.4 2023-03-17 [2] CRAN (R 4.5.0)
#> bookdown 0.41 2024-10-16 [2] CRAN (R 4.5.0)
#> bslib 0.8.0 2024-07-29 [2] CRAN (R 4.5.0)
#> cachem 1.1.0 2024-05-16 [2] CRAN (R 4.5.0)
#> circlize 0.4.16 2024-02-20 [2] CRAN (R 4.5.0)
#> cli 3.6.3 2024-06-21 [2] CRAN (R 4.5.0)
#> clue 0.3-65 2023-09-23 [2] CRAN (R 4.5.0)
#> cluster 2.1.6 2023-12-01 [3] CRAN (R 4.5.0)
#> codetools 0.2-20 2024-03-31 [3] CRAN (R 4.5.0)
#> colorspace 2.1-1 2024-07-26 [2] CRAN (R 4.5.0)
#> colourpicker 1.3.0 2023-08-21 [2] CRAN (R 4.5.0)
#> ComplexHeatmap 2.23.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> crayon 1.5.3 2024-06-20 [2] CRAN (R 4.5.0)
#> curl 5.2.3 2024-09-20 [2] CRAN (R 4.5.0)
#> DBI 1.2.3 2024-06-02 [2] CRAN (R 4.5.0)
#> dbplyr * 2.5.0 2024-03-19 [2] CRAN (R 4.5.0)
#> DelayedArray 0.33.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> digest 0.6.37 2024-08-19 [2] CRAN (R 4.5.0)
#> doParallel 1.0.17 2022-02-07 [2] CRAN (R 4.5.0)
#> dplyr 1.1.4 2023-11-17 [2] CRAN (R 4.5.0)
#> DT 0.33 2024-04-04 [2] CRAN (R 4.5.0)
#> evaluate 1.0.1 2024-10-10 [2] CRAN (R 4.5.0)
#> fansi 1.0.6 2023-12-08 [2] CRAN (R 4.5.0)
#> fastmap 1.2.0 2024-05-15 [2] CRAN (R 4.5.0)
#> filelock 1.0.3 2023-12-11 [2] CRAN (R 4.5.0)
#> fontawesome 0.5.2 2023-08-19 [2] CRAN (R 4.5.0)
#> foreach 1.5.2 2022-02-02 [2] CRAN (R 4.5.0)
#> generics 0.1.3 2022-07-05 [2] CRAN (R 4.5.0)
#> GenomeInfoDb * 1.43.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> GenomeInfoDbData 1.2.13 2024-10-23 [2] Bioconductor
#> GenomicRanges * 1.59.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> GetoptLong 1.0.5 2020-12-15 [2] CRAN (R 4.5.0)
#> ggplot2 3.5.1 2024-04-23 [2] CRAN (R 4.5.0)
#> ggrepel 0.9.6 2024-09-07 [2] CRAN (R 4.5.0)
#> GlobalOptions 0.1.2 2020-06-10 [2] CRAN (R 4.5.0)
#> glue 1.8.0 2024-09-30 [2] CRAN (R 4.5.0)
#> gtable 0.3.6 2024-10-25 [2] CRAN (R 4.5.0)
#> highr 0.11 2024-05-26 [2] CRAN (R 4.5.0)
#> htmltools 0.5.8.1 2024-04-04 [2] CRAN (R 4.5.0)
#> htmlwidgets 1.6.4 2023-12-06 [2] CRAN (R 4.5.0)
#> httpuv 1.6.15 2024-03-26 [2] CRAN (R 4.5.0)
#> httr 1.4.7 2023-08-15 [2] CRAN (R 4.5.0)
#> igraph 2.1.1 2024-10-19 [2] CRAN (R 4.5.0)
#> IRanges * 2.41.0 2024-10-29 [2] Bioconductor 3.21 (R 4.5.0)
#> iSEE 2.19.0 2024-10-29 [2] Bioconductor 3.21 (R 4.