如何使用R计算“通向白宫的路径”?


12

我刚遇到了一个很好的分析,它既有趣又美观:

http://www.nytimes.com/interactive/2012/11/02/us/politics/paths-to-the-white-house.html

我很好奇如何使用R来构造这样的“路径树”。构造这样的路径树需要什么数据和算法?

谢谢。


大致:检查所有 29每个状态中获胜者的组合,并将结果放入9维二进制超表中,根据信息增益将其重新排列到树中,修剪冗余分支。


1
我认为他们实际上做的有些不同:按照EV对州进行排名,然后看看如果每个候选人都赢了,顺着树走会发生什么。因此,您不需要生成29然后修剪。
彼得·弗洛姆

Answers:


10

使用递归解决方案是很自然的。

数据必须包括进行中的州列表,其选票和左侧(“蓝色”)候选人的假定先发优势。(值47在每个步骤中,都要检查两种可能性(左赢还是输)。优势得到更新;如果届时可以基于剩余票数确定结果(赢,输或平局),则计算将停止;否则,将对列表中的其余状态进行递归重复。从而:

paths.compute <- function(start, options, states) {
  if (start > sum(options)) x <- list(Id="O", width=1)
  else if (start < -sum(options)) x <- list(Id="R", width=1)
  else if (length(options) == 0 && start == 0) x <- list(Id="*", width=1)
  else {
    l <- paths.compute(start+options[1], options[-1], states[-1])
    r <- paths.compute(start-options[1], options[-1], states[-1])
    x <- list(Id=states[1], L=l, R=r, width=l$width+r$width, node=TRUE)
  }
  class(x) <- "path"
  return(x)
}

states <- c("FL", "OH", "NC", "VA", "WI", "CO", "IA", "NV", "NH")
votes <- c(29, 18, 15, 13, 10, 9, 5, 6, 4)
p <- paths.compute(47, votes, states)

这有效地修剪了每个节点上的树,比探索所有树所需的计算量少得多 29=512可能的结果。其余的只是图形上的细节,因此我将仅讨论算法中对于有效可视化必不可少的那些部分。

图片

完整的程序如下。它以适度灵活的方式编写,以使用户能够调整许多参数。绘图算法的关键部分是树的布局。为此,plot.path使用一个width字段将剩余的水平空间按比例分配给每个节点的两个后代。最初,该字段的计算方式是paths.compute每个节点下面的叶子(后代)总数。(如果没有进行这样的计算,并且在每个节点上将二叉树简单地分成两半,那么到第九个状态时,1个/512每个叶子可用的总宽度的一半,太窄了。开始在纸上绘制二叉树的任何人都很快遇到了这个问题!)

节点的垂直位置以几何序列(具有相同的比率a)排列,以便在树的较深部分中距离更近。分支的粗细和叶子符号的大小也按深度缩放。(这将导致叶子上的圆形符号出现问题,因为它们的纵横比会随着a变化而变化。我没有费心去解决这个问题。)

paths.compute <- function(start, options, states) {
  if (start > sum(options)) x <- list(Id="O", width=1)
  else if (start < -sum(options)) x <- list(Id="R", width=1)
  else if (length(options) == 0 && start == 0) x <- list(Id="*", width=1)
  else {
    l <- paths.compute(start+options[1], options[-1], states[-1])
    r <- paths.compute(start-options[1], options[-1], states[-1])
    x <- list(Id=states[1], L=l, R=r, width=l$width+r$width, node=TRUE)
  }
  class(x) <- "path"
  return(x)
}

plot.path <- function(p, depth=0, x0=1/2, y0=1, u=0, v=1, a=.9, delta=0,
               x.offset=0.01, thickness=12, size.leaf=4, decay=0.15, ...) {
  #
  # Graphical symbols
  #
  cyan <- rgb(.25, .5, .8, .5); cyan.full <- rgb(.625, .75, .9, 1)
  magenta <- rgb(1, .7, .775, .5); magenta.full <- rgb(1, .7, .775, 1)
  gray <- rgb(.95, .9, .4, 1)
  #
  # Graphical elements: circles and connectors.
  #
  circle <- function(center, radius, n.points=60) {
    z <- (1:n.points) * 2 * pi / n.points
    t(rbind(cos(z), sin(z)) * radius + center)
  }
  connect <- function(x1, x2, veer=0.45, n=15, ...){
    x <- seq(x1[1], x1[2], length.out=5)
    y <- seq(x2[1], x2[2], length.out=5)
    y[2] = veer * y[3] + (1-veer) * y[2]
    y[4] = veer * y[3] + (1-veer) * y[4]
    s = spline(x, y, n)
    lines(s$x, s$y, ...)
  }
  #
  # Plot recursively:
  #
  scale <- exp(-decay * depth)
  if (is.null(p$node)) {
    if (p$Id=="O") {dx <- -y0; color <- cyan.full} 
    else if (p$Id=="R") {dx <- y0; color <- magenta.full}
    else {dx = 0; color <- gray}
    polygon(circle(c(x0 + dx*x.offset, y0), size.leaf*scale/100), col=color, border=NA)
    text(x0 + dx*x.offset, y0, p$Id, cex=size.leaf*scale)
  } else {  
    mid <- ((delta+p$L$width) * v + (delta+p$R$width) * u) / (p$L$width + p$R$width + 2*delta)
    connect(c(x0, (x0+u)/2), c(y0, y0 * a), lwd=thickness*scale, col=cyan, ...)
    connect(c(x0, (x0+v)/2), c(y0, y0 * a), lwd=thickness*scale, col=magenta,  ...)
    plot(p$L, depth=depth+1, x0=(x0+u)/2, y0=y0*a, u, mid, a, delta, x.offset, thickness, size.leaf, decay, ...)
    plot(p$R, depth=depth+1, x0=(x0+v)/2, y0=y0*a, mid, v, a, delta, x.offset, thickness, size.leaf, decay, ...)
  }
}

plot.grid <- function(p, y0=1, a=.9, col.text="Gray", col.line="White", ...) {
  #
  # Plot horizontal lines and identifiers.
  #
  if (!is.null(p$node)) {
    abline(h=y0, col=col.line, ...)
    text(0.025, y0*1.0125, p$Id, cex=y0, col=col.text, ...)
    plot.grid(p$L, y0=y0*a, a, col.text, col.line, ...)
    plot.grid(p$R, y0=y0*a, a, col.text, col.line, ...)
  }
}

states <- c("FL", "OH", "NC", "VA", "WI", "CO", "IA", "NV", "NH")
votes <- c(29, 18, 15, 13, 10, 9, 5, 6, 4)
p <- paths.compute(47, votes, states)

a <- 0.925
eps <- 1/26
y0 <- a^10; y1 <- 1.05

mai <- par("mai")
par(bg="White", mai=c(eps, eps, eps, eps))
plot(c(0,1), c(a^10, 1.05), type="n", xaxt="n", yaxt="n", xlab="", ylab="")
rect(-eps, y0 - eps * (y1 - y0), 1+eps, y1 + eps * (y1-y0), col="#f0f0f0", border=NA)
plot.grid(p, y0=1, a=a, col="White", col.text="#888888")
plot(p, a=a, delta=40, thickness=12, size.leaf=4, decay=0.2)
par(mai=mai)

2
那是一个很好的解决方案。图形令人印象深刻。还有一个partitions软件包可能提供了枚举可能性的结构。
DWin

哇,Whuber,没有足够的V来标记您的答案!
Tal Galili
By using our site, you acknowledge that you have read and understand our Cookie Policy and Privacy Policy.
Licensed under cc by-sa 3.0 with attribution required.