Browse code

remove the tab of some lines

xushuangbin authored on 24/12/2024 03:34:53
Showing 2 changed files

... ...
@@ -53,7 +53,7 @@ plot_heatmap_globalbv <- function(globalbv,
53 53
                                   limits.colour = NULL,
54 54
                                   dist.method = "euclidean",
55 55
                                   hclust.method = "average",
56
-				  threshold = 0.05
56
+                                  threshold = 0.05
57 57
                                   ){
58 58
    p1 <- f1 <- p.lisa.l <- p.lisa.t <- p.moran.l <- p.moran.t <- NULL
59 59
    flag.square <- FALSE
... ...
@@ -106,7 +106,7 @@ pdac_a_spe <- runSGSA(pdac_a_spe,
106 106
                       gset.idx.list = CancerSEASymbol, # The target gene set list
107 107
                       assay.type = 'logcounts', # The name of assays of gene profiler
108 108
                       gsvaExp.name = 'CancerSEA' # The name of result to save to gsvaExps slot
109
-		      )
109
+              )
110 110
 
111 111
 # Then the result was added to gsvaExps to return a SVPExperiment object, the result
112 112
 # can be extracted with gsvaExp, you can view more information via help(gsvaExp).