R idiom for switch / case

时间:2012-05-07 18:57:35

标签: r switch-statement

我有一些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...
}

一些示例输入&amp;输出:

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

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

5 个答案:

答案 0 :(得分: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行,我认为这对我太聪明的代码阈值没问题。 =)

答案 1 :(得分:4)

这是另一种方法:

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表。如果您有很多不同的情况或者它们经常更改并且您想要从中央位置控制它们。

答案 2 :(得分:3)

肯·威廉姆斯对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"

答案 3 :(得分: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)))]
}

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

答案 4 :(得分: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)
}

样本输入&amp;输出:

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

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