19

我有一些基本上看起来像这样的 R 代码:

compute.quantiles <- function(mu, type) {

  ## 'mu' and 'type' are vectors of the same length

  var <- ifelse(type=='a', 6.3523 * mu^2,
         ifelse(type=='b', 234.23 * mu,
         ifelse(type=='c', {s <- 9.8 * ((mu-0.3)/3)^(6/7)+0.19; mu + mu^2/s},
         ifelse(type=='d', 56.345 * mu^1.5,
         ifelse(type=='e', 0.238986 * mu^2,
         ifelse(type=='f', mu + 1.1868823 * mu^2,
         NA ))))))

  # ...then do something with var...
}

一些示例输入和输出:

print(compute.quantiles(2:4, c('c','d','e')))
[1]   2.643840 292.777208   3.823776

这可以正常工作,但是对于深层嵌套来说有点难看,所以我想知道是否有不同的成语效果更好。有人有建议吗?如果switch()接受一个向量作为它的第一个参数,那会很好地工作,但它只需要一个标量。

4

5 回答 5

7

我想我想出了一些我更喜欢的东西:

## Vector-switch
vswitch <- function(EXPR, ...) {
    vars <- cbind(...)
    vars[cbind(seq_along(EXPR), match(EXPR, names(list(...))))]
}

compute.quantiles <- function(mu, type) {
  stopifnot(length(mu) == length(type))

  vswitch( type,
    a = 6.3523 * mu^2,
    b = 234.23 * mu,
    c = mu + mu^2/(9.8 * ((mu-0.3)/3)^(6/7)+0.19),
    d = 56.345 * mu^1.5,
    e = 0.238986 * mu^2,
    f = mu + 1.1868823 * mu^2)
}

矩阵索引代码只有 2 行,我认为我的代码阈值太聪明了。=)

于 2012-05-07T20:21:39.610 回答
5

这是另一种方法:

library(data.table)
# Case selection table:
dtswitch <- data.table(type=letters[1:6],
                      result=c("6.3523 * mu^2",
                               "234.23 * mu",
                               "{s <- 9.8 * ((mu-0.3)/3)^(6/7)+0.19; mu + mu^2/s}",
                               "56.345 * mu^1.5",
                               "0.238986 * mu^2",
                               "mu + 1.1868823 * mu^2"),
                      key="type")

# Data to which you want the cases applied:
compute <- data.table(type=letters[3:5],mu=2:4,key="type")

# Join the data table with the case selection table, and evaluate the results:
dtswitch[compute,list(mu,result=eval(parse(text=result)))]
#>   type mu     result
#>1:    c  2   2.643840
#>2:    d  3 292.777208
#>3:    e  4   3.823776

您可以将其存储在外部电子表格或数据库中,然后将其加载到 R 中,而不是在 R 代码中创建 dtswitch 表。如果您有很多不同的情况,或者它们经常更改并且您希望从一个中心位置。

于 2013-08-16T17:10:37.347 回答
3

Ken Williams 的实现vswitch不适用于某些类型的输入。我认为这个更灵活:

vswitch <- function(expr, ...) {
  lookup <- list(...)
  vec <- as.character(expr)
  vec[is.na(vec)] <- "NA"
  unname(do.call(c, lookup[vec]))
}

要将它与数字查找值一起使用,您需要引用或反引用它们:

num_vec <- c(1, 3, 2, 2, 1)
vswitch(num_vec, `1` = 10, `2` = 25, `3` = 50)
## [1] 10 50 25 25 10

使用字符查找:

char_vec <- letters[num_vec]
vswitch(char_vec, a = "Albert", b = "Bertrand", c = "Charles")
## [1] "Albert"   "Charles"  "Bertrand" "Bertrand" "Albert"
于 2014-09-23T07:55:48.193 回答
1

也许这样的事情是可行的:

compute.quantiles <- function(mu, type) {
  stopifnot(length(mu) == length(type))

  vars <- cbind(
    a = 6.3523 * mu^2,
    b = 234.23 * mu,
    c = mu + mu^2/(9.8 * ((mu-0.3)/3)^(6/7)+0.19),
    d = 56.345 * mu^1.5,
    e = 0.238986 * mu^2,
    f = mu + 1.1868823 * mu^2)

  vars[cbind(seq_along(mu), match(type, colnames(vars)))]
}

不过,不确定这对于未来的读者(包括我自己)是否会显得过于“先进”。

于 2012-05-07T19:20:56.477 回答
0

我忍不住用完全不同的方法添加另一个答案。这里是。

## Sort of a cross between tapply() and ave()
tswitch <- function(x, INDEX, ...) {
  l <- substitute(list(...))
  s <- split(x, INDEX)
  pf <- parent.frame()
  split(x, INDEX) <- lapply(names(s), function(n) 
    eval(l[[n]], list(x=s[[n]]), pf)
  )
  x
}

compute.quantiles <- function(mu, type) {
  stopifnot(length(mu) == length(type))

  tswitch(mu, type,
    a = 6.3523 * x^2,
    b = 234.23 * x,
    c = x + x^2/(9.8 * ((x-0.3)/3)^(6/7)+0.19),
    d = 56.345 * x^1.5,
    e = 0.238986 * x^2,
    f = x + 1.1868823 * x^2)
}

以及示例输入和输出:

> compute.quantiles(2:4, c('c','d','e'))
[1]   2.643840 292.777208   3.823776

这种实现的优点是它只计算length(mu)需要计算的特定值。相比之下,vswitch上面的方法计算length(mu) * M值,其中M是开关中“案例”的数量。因此,如果计算成本很高,或者数据很大,那么这个版本可能是一个胜利。

于 2012-05-14T18:13:18.040 回答