- pattern = "", else fails when called with no first letter
- create and export derived methods, else RStudio does not recognize
inheritance (seems like a bug in RStudio)
git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/Biobase@129302 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -49,8 +49,7 @@ exportMethods("[", "[[", "$", abstract, aggenv, aggfun, |
49 | 49 |
AnnotatedDataFrame, |
50 | 50 |
ExpressionSet) |
51 | 51 |
|
52 |
-export(.DollarNames.eSet, |
|
53 |
- Aggregate, addVigs2WinMenu, anyMissing, |
|
52 |
+export(Aggregate, addVigs2WinMenu, anyMissing, |
|
54 | 53 |
as.data.frame.ExpressionSet, assayDataNew, |
55 | 54 |
assayDataValidMembers, assayDataElementNames, assayDataElement, |
56 | 55 |
assayDataElementReplace, "assayDataElement<-", cache, copyEnv, |
... | ... |
@@ -62,5 +61,7 @@ export(.DollarNames.eSet, |
62 | 61 |
selectSome, strbreak, subListExtract, testBioCConnection, |
63 | 62 |
lcSuffix, lcPrefix, lcPrefixC, updateOldESet, userQuery, |
64 | 63 |
validMsg, write.AnnotatedDataFrame) |
64 |
+S3method(.DollarNames, "eSet") |
|
65 |
+S3method(.DollarNames, "ExpressionSet") |
|
65 | 66 |
S3method(head, "AnnotatedDataFrame") |
66 | 67 |
S3method(tail, "AnnotatedDataFrame") |
... | ... |
@@ -407,7 +407,7 @@ setMethod("$", "eSet", function(x, name) { |
407 | 407 |
eval(substitute(phenoData(x)$NAME_ARG, list(NAME_ARG=name))) |
408 | 408 |
}) |
409 | 409 |
|
410 |
-.DollarNames.eSet <- function(x, pattern) |
|
410 |
+.DollarNames.eSet <- function(x, pattern = "") |
|
411 | 411 |
grep(pattern, names(pData(x)), value=TRUE) |
412 | 412 |
|
413 | 413 |
setReplaceMethod("$", "eSet", function(x, name, value) { |