试试这个:
遍历继承图,获取各自的方法
methodsPerClass <- function(x) {
if (!inherits(x, "envRefClass")) {
stop("This only works for Reference Class objects")
}
## Get all superclasses of class of 'x' //
supercl <- selectSuperClasses(getClass(class(b)), directOnly=FALSE)
## Get all methods per superclass //
out <- lapply(c(class(x), supercl), function(ii) {
## Get generator object //
generator <- NULL
if (inherits(getClass(ii), "refClassRepresentation")) {
generator <- getRefClass(ii)
}
## Look up method names in class defs //
out <- NULL
if (!is.null(generator)) {
out <- names(Filter(function(x) {
attr(x, "refClassName") == generator$className
},
as.list(generator$def@refMethods))
)
}
return(out)
})
names(out) <- supercl
## Filter out the non-reference-classes //
idx <- which(sapply(out, is.null))
if (length(idx)) {
out <- out[-idx]
}
## Nicer name for actual class of 'x' //
idx <- which(names(out) == "envRefClass")
if (length(idx)) {
names(out)[idx] <- class(x)
}
return(out)
}
我敢肯定,人们可以想出一些更好的方法来过滤掉非引用类,以便在最后摆脱“idx”部分,但它确实有效。
这会给你:
methodsPerClass(x=b)
$A
[1] "bar"
$B
[1] "foo"
$.environment
[1] "import" "usingMethods" "show" "getClass" "untrace"
[6] "export" "callSuper" "copy" "initFields" "getRefClass"
[11] "trace" "field"
查询哪些方法具体属于哪个类
whosMethod <- function(x, method) {
mthds <- methodsPerClass(x=x)
out <- lapply(method, function(m) {
pattern <- paste0("^", m, "$")
idx <- which(sapply(mthds, function(ii) {
any(grepl(pattern, ii))
}))
if (!length(idx)) {
stop(paste0("Invalid method '", m,
"' (not a method of class '", class(x), "')"))
}
out <- names(idx)
})
names(out) <- method
return(out)
}
这会给你:
whosMethod(x=b, method="foo")
$foo
[1] "B"
whosMethod(x=b, method=c("foo", "bar"))
$foo
[1] "B"
$bar
[1] "A"
whosMethod(x=b, method=c("foo", "bar", "nonexisting"))
Error in FUN(c("foo", "bar", "nonexisting")[[3L]], ...) :
Invalid method 'nonexisting' (not a method of class 'B')
为“B”类的所有方法运行它:
whosMethod(x=b, method=unlist(methodsPerClass(x=b)))
$bar
[1] "A"
$foo
[1] "B"
$import
[1] ".environment"
$usingMethods
[1] ".environment"
$show
[1] ".environment"
$getClass
[1] ".environment"
$untrace
[1] ".environment"
$export
[1] ".environment"
$callSuper
[1] ".environment"
$copy
[1] ".environment"
$initFields
[1] ".environment"
$getRefClass
[1] ".environment"
$trace
[1] ".environment"
$field
[1] ".environment"