Browse code

minor space adjust

snikumbh authored on 03/04/2022 00:34:50
Showing 1 changed files

... ...
@@ -82,7 +82,7 @@ viz_bas_vec <- function(feat_mat, ptype = c("heatmap", "seqlogo"),
82 82
         }
83 83
         if("seqlogo" %in% ptype){
84 84
             p2 <- viz_pwm(pwm_mat = pwm, method = method, pdf_name = NULL,
85
-                          pos_lab = pos_lab, fixed_coord = fixed_coord)
85
+                            pos_lab = pos_lab, fixed_coord = fixed_coord)
86 86
             # p2 <- p2 + theme(plot.margin = margin(0,0,0,0, unit="cm"))
87 87
             if(length(ptype) == 1) return(p2)
88 88
             pl[[match("seqlogo", ptype)]] <- p2