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