...
|
...
|
@@ -69,6 +69,8 @@ makePWM <- function(pwm, alphabet = "DNA") {
|
69
|
69
|
#'
|
70
|
70
|
#' @describeIn pwm-class Shows the position weight matrix.
|
71
|
71
|
#'
|
|
72
|
+#' @export
|
|
73
|
+#'
|
72
|
74
|
setMethod("show", signature(object = "pwm"), function(object) {
|
73
|
75
|
print(round(object@pwm, 4))
|
74
|
76
|
})
|
...
|
...
|
@@ -77,6 +79,8 @@ setMethod("show", signature(object = "pwm"), function(object) {
|
77
|
79
|
#'
|
78
|
80
|
#' @describeIn pwm-class Prints the summary information about position weight
|
79
|
81
|
#' matrix.
|
|
82
|
+#'
|
|
83
|
+#' @export
|
80
|
84
|
#'
|
81
|
85
|
setMethod("summary", signature(object = "pwm"), function(object, ...) {
|
82
|
86
|
cat("Position weight matrix:\n")
|
...
|
...
|
@@ -92,6 +96,8 @@ setMethod("summary", signature(object = "pwm"), function(object, ...) {
|
92
|
96
|
#' @param ... additional parameters for `plot` function
|
93
|
97
|
#'
|
94
|
98
|
#' @describeIn pwm-class Plots the sequence logo of the position weight matrix.
|
|
99
|
+#'
|
|
100
|
+#' @export
|
95
|
101
|
#'
|
96
|
102
|
setMethod("plot", signature(x = "pwm"), function(x, y = "missing", ...) {
|
97
|
103
|
seqLogo(x)
|