切り捨てられた多項分布をサンプリングする方法は?


9

切り捨てられた多項分布をサンプリングするアルゴリズムが必要です。あれは、

x1Zp1x1pkxkx1!xk!

ここで、は正規化定数、xk個の正の成分を持ち、x i = nです。私は唯一の値を検討Xの範囲内XBをZxkxi=nxaxb

この切り捨てられた多項分布をどのようにサンプリングできますか?

注:切り捨てられていない多項分布をサンプリングするアルゴリズムについては、Wikipediaを参照してください。このアルゴリズムを切り捨てられた分布に適応させる方法はありますか?

均一バージョン:問題のより単純なバージョンは、すべての等しくする、p i = 1 / kです。この場合、少なくとも切り捨てられた分布をサンプリングするアルゴリズムを設計できる場合は、それを投稿してください。一般的な答えではありませんが、それは現時点で他の実際的な問題を解決するのに役立ちます。pipi=1/k

回答:


9

x1,,xkp1,,pkixi=naixibixi

私は3つの解決策を見ます(切り捨てられていない場合ほどエレガントではありません):

  1. 承認-拒否。切り捨てられていない多項式からのサンプル。切り捨ての境界に適合する場合はサンプルを受け入れ、そうでない場合は拒否してプロセスを繰り返します。高速ですが、非常に非効率的です。
rtrmnomReject <- function(R, n, p, a, b) {
  x <- t(rmultinom(R, n, p))
  x[apply(a <= x & x <= b, 1, all) & rowSums(x) == n, ]
}
  1. nxibi
# single draw from truncated multinomial with a,b truncation points
rtrmnomDirect <- function(n, p, a, b) {
  k <- length(p)

  repeat {
    pp <- p         # reset pp
    x <- numeric(k) # reset x
    repeat {
      if (sum(x<b) == 1) { # if only a single category is left
        x[x<b] <- x[x<b] + n-sum(x) # fill this category with reminder
        break
      }
      i <- sample.int(k, 1, prob = pp) # sample x[i]
      x[i] <- x[i] + 1  
      if (x[i] == b[i]) pp[i] <- 0 # if x[i] is filled do
      # not sample from it
      if (sum(x) == n) break    # if we picked n, stop
    }
    if (all(x >= a)) break # if all x>=a sample is valid
    # otherwise reject
  }

  return(x)
}
  1. X1y=q(Xi1)Xif(y)/f(Xi1)Xi1f(x)ipixi/xi!qXi1step
# draw R values
# 'step' parameter defines magnitude of jumps
# for Meteropolis algorithm
# 'init' is a vector of values to start with
rtrmnomMetrop <- function(R, n, p, a, b,
                          step = 1,
                          init = rtrmnomDirect(n, p, a, b)) {

  k <- length(p)
  if (length(a)==1) a <- rep(a, k)
  if (length(b)==1) b <- rep(b, k)

  # approximate target log-density
  lp <- log(p)
  lf <- function(x) {
    if(any(x < a) || any(x > b) || sum(x) != n)
      return(-Inf)
    sum(lp*x - lfactorial(x))
  }

  step <- max(2, step+1)

  # proposal function
  q <- function(x) {
    idx <- sample.int(k, 2)
    u <- sample.int(step, 1)-1
    x[idx] <- x[idx] + c(-u, u)
    x
  }

  tmp <- init
  x <- matrix(nrow = R, ncol = k)
  ar <- 0

  for (i in 1:R) {
    proposal <- q(tmp)
    prob <- exp(lf(proposal) - lf(tmp))
    if (runif(1) < prob) {
      tmp <- proposal
      ar <- ar + 1
    }
    x[i,] <- tmp
  }

  structure(x, acceptance.rate = ar/R, step = step-1)
}

X1step

n <- 500
a <- 50
b <- 125
p <- c(1,5,2,4,3)/15
k <- length(p)
x <- rtrmnomMetrop(1e4, n, p, a, b, step = 15)

cmb <- combn(1:k, 2)

par.def <- par(mfrow=c(4,5), mar = c(2,2,2,2))
for (i in 1:k)
  hist(x[,i], main = paste0("X",i))
for (i in 1:k)
  plot(x[,i], main = paste0("X",i), type = "l", col = "lightblue")
for (i in 1:ncol(cmb))
  plot(jitter(x[,cmb[1,i]]), jitter(x[,cmb[2,i]]),
       type = "l", main = paste(paste0("X", cmb[,i]), collapse = ":"),
       col = "gray")
par(par.def)

ここに画像の説明を入力してください

p1pka1==akb1=bkaibip1p2a1a2b1b2

npipi


AL、ルキン(2007)。治療配分問題における通常の統計量と幾何確率変数の合計。統計と確率の手紙、77(12)、1312-1321。

AL、ルキン(2008)。均衡配分問題における停止規則:正確な漸近分布。逐次分析、27(3)、277-292。


yi=xiaim=niaiyibiaixaa

@beckoあなたがそのようなアプローチを私が説明したものと比較すると、それらが異なる解決策を与えることがわかります。
ティム

それらがどのように異なるのか理解できませんか?私がしたのは変数の変更だけでした。
becko

@beckoあなたの出発点はすべてx[i] >= aです。バイアスコインを表の確率= 0.9で投げたと想像してください。少なくとも10の表と10の表が出るまでコインを投げます。停止点では、平均して、尾よりもはるかに多くの頭を持つことになります。で始まるとx[1] = ... = x[k] = aは、x[i]が異なるために、それぞれの開始点が異なるという事実を無視することを意味しますp[i]
ティム

あなたの言ってる事がわかります。あなたのソリューションについて私が気に入らない唯一のことは、特定のパラメーターの選択に対しては非常に非効率的である可能性があることです。
becko

1

TimのRコードをPythonに変換しようとする私の努力は次のとおりです。この問題を理解し、Pythonでアルゴリズムをコーディングしたので、人々が興味を持っている場合に備えて、ここでそれらを共有することを考えました。

  1. Accept-Rejectアルゴリズム
def sample_truncated_multinomial_accept_reject(k, pVec, a, b):
    x = list(np.random.multinomial(k, pVec, size=1)[0])
    h = [x[i] >= a[i] and x[i] <= b[i] for i in range(len(x))]
    while sum(h) < len(h):
        x = list(np.random.multinomial(k, pVec, size=1)[0])
        h = [x[i] >= a[i] and x[i] <= b[i] for i in range(len(x))]
    return x
  1. 直接シミュレーション
def truncated_multinomial_direct_sampling_from_urn(k, pVec, a, b):
    n = len(pVec)
    while True:
        pp = pVec 
        x = [0 for _ in range(n)] 
        while True:
            if sum([x[h] < b[h] for h in range(n)])==1:
                indx = [h for h in range(n) if x[h] < b[h]][0]
                x[indx] = k - sum(x)
                break
            i = np.random.choice(n, 1, p=pp)[0]
            x[i] += 1
            if x[i] == b[i]:
                pp = [pp[j]/(1-pp[i]) for j in range(n)]
                pp[i] = 0 
            if sum(x) == k:
                break  
        if sum([x[h] < a[h] for h in range(n)]) == 0:
            break 
    return x 
  1. メトロポリスアルゴリズム
def compute_log_function(x, pVec, a, b):
    x_less_a = sum([x[i] < a[i] for i in range(len(pVec))])
    x_more_a = sum([x[i] > b[i] for i in range(len(pVec))])
    if x_less_a or x_more_a or sum(x) != k:
        return float("-inf")
    return np.sum(np.log(pVec)*x - np.array([math.lgamma(h+1) for h in x]))
def sampling_distribution(original, pVec, a, b, step):
    x = copy.deepcopy(original) 
    idx = np.random.choice(len(x), 2, replace=False)
    u = np.random.choice(step, 1)[0]
    x[idx[0]] -= u
    x[idx[1]] += u
    x_less_a = sum([x[i] < a[i] for i in range(len(pVec))])
    x_more_a = sum([x[i] > b[i] for i in range(len(pVec))])
    while x_less_a or x_more_a or sum(x) != k:
        x = copy.deepcopy(original)  
        idx = np.random.choice(len(x), 2, replace=False)
        u = np.random.choice(step, 1)[0]
        x[idx[0]] -= u
        x[idx[1]] += u
        x_less_a = sum([x[i] < a[i] for i in range(len(pVec))])
        x_more_a = sum([x[i] > b[i] for i in range(len(pVec))])
    return x 
def sample_truncated_multinomial_metropolis_hasting(k, pVec, a, b, iters, step=1):
    tmp=sample_truncated_multinomial_accept_reject(k, pVec, a, b)[0]
    step = max(2, step)
    for i in range(iters):
        proposal = sampling_distribution(tmp, pVec, a, b, step)
        if compute_log_function(proposal, pVec, a, b) == float("-inf"):
            continue             
        prob = np.exp(np.array(compute_log_function(proposal, pVec, a, b)) -\
                      np.array(compute_log_function(tmp, pVec, a, b)))
        if np.random.uniform() < prob:
            tmp = proposal 
        step -= 1 
    return tmp

このコードの完全な実装については、私のGithubリポジトリを参照してください。

https://github.com/mohsenkarimzadeh/sampling

弊社のサイトを使用することにより、あなたは弊社のクッキーポリシーおよびプライバシーポリシーを読み、理解したものとみなされます。
Licensed under cc by-sa 3.0 with attribution required.