Skip to content

Commit

Permalink
raster size
Browse files Browse the repository at this point in the history
  • Loading branch information
abel.vertesy committed Nov 1, 2023
1 parent e686e51 commit e06091a
Showing 1 changed file with 7 additions and 6 deletions.
13 changes: 7 additions & 6 deletions R/Seurat.Utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -3098,7 +3098,7 @@ multiFeaturePlot.A4 <- function(list.of.genes # Save multiple FeaturePlots, as j
, w = wA4, h = hA4, scaling = 1
, format = c('jpg', 'pdf', 'png')[1]
, raster = MarkdownHelpers::FALSE.unless('b.raster')
# , raster.dpi = c(512, 512)/4
, raster.dpi = NULL
, ...
# , jpeg.res = 225, jpeg.q = 90
) {
Expand All @@ -3125,14 +3125,13 @@ multiFeaturePlot.A4 <- function(list.of.genes # Save multiple FeaturePlots, as j
genes = list.of.genes.found[lsG[[i]]]
iprint(i,genes )
plotname = kpp(c(prefix, plot.reduction,i, genes, suffix, format ))

if (raster == TRUE) cex <- 1 # https://github.com/satijalab/seurat/issues/7466#issuecomment-1601276032
if (raster == TRUE) cex <- 1 # https://github.com/satijalab/seurat/issues/7466#issuecomment-1601276032 "Remove in 2024, fixed in 4.4.0"

plot.list = Seurat::FeaturePlot(object = obj, features = genes, reduction = plot.reduction, combine = F
, ncol = nr.Col, cols = colors
, min.cutoff = gene.min.exp, max.cutoff = gene.max.exp
, raster = raster
# , raster.dpi = raster.dpi
, raster.dpi = raster.dpi
, pt.size = cex
, ...)

Expand Down Expand Up @@ -3338,7 +3337,8 @@ qQC.plots.BrainOrg <- function(obj = combined.obj, title = "Top 4 QC markers on
#' }
#' }
#' @export
qMarkerCheck.BrainOrg <- function(obj = combined.obj, custom.genes = F, suffix = "") {
qMarkerCheck.BrainOrg <- function(obj = combined.obj, custom.genes = F, suffix = ""
, raster.dpi = c(512, 256) / 2) {
Signature.Genes.Top24 <- if (!isFALSE(custom.genes)) custom.genes else
{
Signature.Genes.Top24 <- c(
Expand All @@ -3364,7 +3364,8 @@ qMarkerCheck.BrainOrg <- function(obj = combined.obj, custom.genes = F, suffix =
multiFeaturePlot.A4(obj = obj, layout = "tall"
, list.of.genes = Signature.Genes.Top24
, caption = names(Signature.Genes.Top24)
, foldername = sppp('Signature.Genes.Top24', suffix))
, foldername = sppp('Signature.Genes.Top24', suffix)
, raster.dpi = raster.dpi)
}


Expand Down

0 comments on commit e06091a

Please sign in to comment.