使用R来解决Lucky 26游戏


15

我正试图向我的儿子展示如何使用编码来解决游戏带来的问题,以及如何让R处理大数据。有问题的游戏称为“幸运26”。在此游戏中,数字(1-12,无重复)位于大卫之星的12个点(6个顶点,6个交点)上,并且6行4个数字必须全部加为26。在大约4.79亿可能性中(12P12 )显然有144个解决方案。我试图按照以下方式在R中对此进行编码,但内存似乎是一个问题。如果成员有时间,我将不胜感激任何建议以提高答案。预先感谢成员。

library(gtools)

x=c()
elements <- 12
for (i in 1:elements)
{ 
    x[i]<-i
}

soln=c()            

y<-permutations(n=elements,r=elements,v=x)  
j<-nrow(y)
for (i in 1:j) 
{
L1 <- y[i,1] + y[i,3] + y[i,6] + y[i,8]
L2 <- y[i,1] + y[i,4] + y[i,7] + y[i,11]
L3 <- y[i,8] + y[i,9] + y[i,10] + y[i,11]
L4 <- y[i,2] + y[i,3] + y[i,4] + y[i,5]
L5 <- y[i,2] + y[i,6] + y[i,9] + y[i,12]
L6 <- y[i,5] + y[i,7] + y[i,10] + y[i,12]
soln[i] <- (L1 == 26)&(L2 == 26)&(L3 == 26)&(L4 == 26)&(L5 == 26)&(L6 == 26) 
}

z<-which(soln)
z

3
我不了解其逻辑,但您应该将方法向量化。x<- 1:elements更重要的是L1 <- y[,1] + y[,3] + y[,6] + y[,8]。这并不能真正解决您的内存问题,因此您可以随时查看rcpp
Cole

4
请不要rm(list=ls())输入您的MRE。如果有人将其复制粘贴到活动会话中,则他们可能会丢失自己的数据。
dww

上RM道歉(列表= LS())..
DesertProject

您确定只有144个吗?我仍在研究中,得到480,但是我不确定我目前的方法。
科尔

1
@科尔,我得到960个解决方案。
约瑟夫·伍德

Answers:


3

这是另一种方法。它是基于一个MathWorks的博客文章克里夫·莫勒尔,第一MATLAB的作者。

在博客文章中,为了节省内存,作者仅置换了10个元素,将第一个元素保留为顶点元素,将第7个元素保留为基本元素。因此,仅10! == 3628800需要测试排列。
在下面的代码中,

  1. 生成元素1到的排列10。共有都是10! == 3628800他们的。
  2. 选择11作为顶点元素并使其固定。分配从哪里开始并不重要,其他元素将处于正确的相对位置。
  3. 然后将第12个元素for循环分配到第2个位置,第3个位置等。

这将产生大多数解决方案,产生或产生旋转和反射。但这不能保证解决方案是唯一的。它也相当快。

elements <- 12
x <- seq_len(elements)
p <- gtools::permutations(n = elements - 2, r = elements - 2, v = x[1:10])  

i1 <- c(1, 3, 6, 8)
i2 <- c(1, 4, 7, 11)
i3 <- c(8, 9, 10, 11)
i4 <- c(2, 3, 4, 5)
i5 <- c(2, 6, 9, 12)
i6 <- c(5, 7, 10, 12)

result <- vector("list", elements - 1)
for(i in 0:10){
  if(i < 1){
    p2 <- cbind(11, 12, p)
  }else if(i == 10){
    p2 <- cbind(11, p, 12)
  }else{
    p2 <- cbind(11, p[, 1:i], 12, p[, (i + 1):10])
  }
  L1 <- rowSums(p2[, i1]) == 26
  L2 <- rowSums(p2[, i2]) == 26
  L3 <- rowSums(p2[, i3]) == 26
  L4 <- rowSums(p2[, i4]) == 26
  L5 <- rowSums(p2[, i5]) == 26
  L6 <- rowSums(p2[, i6]) == 26

  i_sol <- which(L1 & L2 & L3 & L4 & L5 & L6)
  result[[i + 1]] <- if(length(i_sol) > 0) p2[i_sol, ] else NA
}
result <- do.call(rbind, result)
dim(result)
#[1] 82 12

head(result)
#     [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12]
#[1,]   11   12    1    3   10    5    8    9    7     6     4     2
#[2,]   11   12    1    3   10    8    5    6    4     9     7     2
#[3,]   11   12    1    7    6    4    3   10    2     9     5     8
#[4,]   11   12    3    2    9    8    6    4    5    10     7     1
#[5,]   11   12    3    5    6    2    9   10    8     7     1     4
#[6,]   11   12    3    6    5    4    2    8    1    10     7     9

6

实际上有960个解决方案。下面,我们利用RcppRcppAlgos*parallel程序包,仅6 seconds使用4个核即可获得解决方案。即使您选择对基数R使用单线程方法lapply,该解决方案也将在25秒左右返回。

首先,我们编写一种简单的算法C++来检查特定的排列。您会注意到,我们使用一个数组来存储所有六行。这是为了提高性能,因为我们比使用6个单独的阵列更有效地利用缓存。您还必须记住C++使用基于零的索引。

#include <Rcpp.h>
using namespace Rcpp;
// [[Rcpp::plugins(cpp11)]]

constexpr int index26[24] = {0, 2, 5, 7,
                             0, 3, 6, 10,
                             7, 8, 9, 10,
                             1, 2, 3, 4,
                             1, 5, 8, 11,
                             4, 6, 9, 11};

// [[Rcpp::export]]
IntegerVector DavidIndex(IntegerMatrix mat) {
    const int nRows = mat.nrow();
    std::vector<int> res;

    for (int i = 0; i < nRows; ++i) {
        int lucky = 0;

        for (int j = 0, s = 0, e = 4;
             j < 6 && j == lucky; ++j, s += 4, e += 4) {

            int sum = 0;

            for (int k = s; k < e; ++k)
                sum += mat(i, index26[k]);

            lucky += (sum == 26);
        }

        if (lucky == 6) res.push_back(i);
    }

    return wrap(res);
}

现在,使用中的lowerupper参数permuteGeneral,我们可以生成排列的块并分别进行测试以检查内存。下面,我选择一次测试470万个排列。输出给出了排列12的词典索引!从而满足“幸运26”条件。

library(RcppAlgos)
## N.B. 4790016L evenly divides 12!, so there is no need to check
## the upper bound on the last iteration below

system.time(solution <- do.call(c, parallel::mclapply(seq(1L, factorial(12), 4790016L), function(x) {
    perms <- permuteGeneral(12, 12, lower = x, upper = x + 4790015)
    ind <- DavidIndex(perms)
    ind + x
}, mc.cores = 4)))

  user  system elapsed 
13.005   6.258   6.644

## Foregoing the parallel package and simply using lapply,
## we obtain the solution in about 25 seconds:
##   user  system elapsed 
## 18.495   6.221  24.729

现在,我们验证使用permuteSample和参数sampleVec,该参数允许您生成特定的排列(例如,如果传递1,它将为您提供第一个排列(即1:12))。

system.time(Lucky26 <- permuteSample(12, 12, sampleVec=solution))
 user  system elapsed 
0.001   0.000   0.001

head(Lucky26)
     [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12]
[1,]    1    2    4   12    8   10    6   11    5     3     7     9
[2,]    1    2    6   10    8   12    4    7    3     5    11     9
[3,]    1    2    7   11    6    8    5   10    4     3     9    12
[4,]    1    2    7   12    5   10    4    8    3     6     9    11
[5,]    1    2    8    9    7   11    4    6    3     5    12    10
[6,]    1    2    8   10    6   12    4    5    3     7    11     9

tail(Lucky26)
       [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11] [,12]
[955,]   12   11    5    3    7    1    9    8   10     6     2     4
[956,]   12   11    5    4    6    2    9    7   10     8     1     3
[957,]   12   11    6    1    8    3    9    5   10     7     4     2
[958,]   12   11    6    2    7    5    8    3    9    10     4     1
[959,]   12   11    7    3    5    1    9    6   10     8     2     4
[960,]   12   11    9    1    5    3    7    2    8    10     6     4

最后,我们使用基数R验证我们的解决方案rowSums

all(rowSums(Lucky26[, c(1, 3, 6, 8]) == 26)
[1] TRUE

all(rowSums(Lucky26[, c(1, 4, 7, 11)]) == 26)
[1] TRUE

all(rowSums(Lucky26[, c(8, 9, 10, 11)]) == 26)
[1] TRUE

all(rowSums(Lucky26[, c(2, 3, 4, 5)]) == 26)
[1] TRUE

all(rowSums(Lucky26[, c(2, 6, 9, 12)]) == 26)
[1] TRUE

all(rowSums(Lucky26[, c(5, 7, 10, 12)]) == 26)
[1] TRUE

*我是的作者RcppAlgos


6

对于排列,很棒。不幸的是,在12个字段中有4.79 亿种可能性,这意味着对大多数人来说占用太多内存:

library(RcppAlgos)
elements <- 12
permuteGeneral(elements, elements)
#> Error: cannot allocate vector of size 21.4 Gb

有一些选择。

  1. 取样排列。意思是,只做一百万而不是四亿七千九百万。为此,您可以使用permuteSample(12, 12, n = 1e6)。请参阅@JosephWood的答案,以类似的方式进行,除了他抽样了4.79亿个排列;)

  2. 建立一个循环,以评估创建时的排列。这样可以节省内存,因为您最终将构建该函数以仅返回正确的结果。

  3. 使用其他算法来解决问题。我将重点介绍此选项。

带约束的新算法

R中的幸运星26

细分应为26

我们知道上面星形中的每个线段最多需要加26。我们可以将约束添加到生成排列中-仅给我们加起来最多26的组合:

# only certain combinations will add to 26
lucky_combo <- comboGeneral(12, 4, comparisonFun = '==', constraintFun = 'sum', limitConstraints = 26L)

ABCDEFGH

在上面的星星中,我给三个组分别上色:ABCDEFGHIJLK。前两个组也没有共同点,并且也位于感兴趣的线段上。因此,我们可以添加另一个约束:对于总计达26个的组合,我们需要确保ABCDEFGH没有数字重叠。IJLK将被分配剩余的4个号码。

library(RcppAlgos)
lucky_combo <- comboGeneral(12, 4, comparisonFun = '==', constraintFun = 'sum', limitConstraints = 26L)
two_combo <- comboGeneral(nrow(lucky_combo), 2)

unique_combos <- !apply(cbind(lucky_combo[two_combo[, 1], ], lucky_combo[two_combo[, 2], ]), 1, anyDuplicated)

grp1 <- lucky_combo[two_combo[unique_combos, 1],]
grp2 <- lucky_combo[two_combo[unique_combos, 2],]
grp3 <- t(apply(cbind(grp1, grp2), 1, function(x) setdiff(1:12, x)))

通过组进行置换

我们需要找到每个组的所有排列。也就是说,我们只有合计为26的组合。例如,我们需要take 1, 2, 11, 12和make 1, 2, 12, 11; 1, 12, 2, 11; ...

#create group perms (i.e., we need all permutations of grp1, grp2, and grp3)
n <- 4
grp_perms <- permuteGeneral(n, n)
n_perm <- nrow(grp_perms)

# We create all of the permutations of grp1. Then we have to repeat grp1 permutations
# for all grp2 permutations and then we need to repeat one more time for grp3 permutations.
stars <- cbind(do.call(rbind, lapply(asplit(grp1, 1), function(x) matrix(x[grp_perms], ncol = n)))[rep(seq_len(sum(unique_combos) * n_perm), each = n_perm^2), ],
           do.call(rbind, lapply(asplit(grp2, 1), function(x) matrix(x[grp_perms], ncol = n)[rep(1:n_perm, n_perm), ]))[rep(seq_len(sum(unique_combos) * n_perm^2), each = n_perm), ],
           do.call(rbind, lapply(asplit(grp3, 1), function(x) matrix(x[grp_perms], ncol = n)[rep(1:n_perm, n_perm^2), ])))

colnames(stars) <- LETTERS[1:12]

最终计算

最后一步是做数学。我在这里使用lapply()Reduce()做更多的功能编程-否则,很多代码将被键入六次。有关数学代码的更详尽说明,请参见原始解决方案。

# creating a list will simplify our math as we can use Reduce()
col_ind <- list(c('A', 'B', 'C', 'D'), #these two will always be 26
                c('E', 'F', 'G', 'H'),  #these two will always be 26
                c('I', 'C', 'J', 'H'), 
                c('D', 'J', 'G', 'K'),
                c('K', 'F', 'L', 'A'),
                c('E', 'L', 'B', 'I'))

# Determine which permutations result in a lucky star
L <- lapply(col_ind, function(cols) rowSums(stars[, cols]) == 26)
soln <- Reduce(`&`, L)

# A couple of ways to analyze the result
rbind(stars[which(soln),], stars[which(soln), c(1,8, 9, 10, 11, 6, 7, 2, 3, 4, 5, 12)])
table(Reduce('+', L)) * 2

      2       3       4       6 
2090304  493824   69120     960 

交换ABCDEFGH

在上面的代码末尾,我利用了我们可以交换ABCDEFGH获得剩余排列的优势。这是确认是的代码,我们可以交换两个组并正确设置:

# swap grp1 and grp2
stars2 <- stars[, c('E', 'F', 'G', 'H', 'A', 'B', 'C', 'D', 'I', 'J', 'K', 'L')]

# do the calculations again
L2 <- lapply(col_ind, function(cols) rowSums(stars2[, cols]) == 26)
soln2 <- Reduce(`&`, L2)

identical(soln, soln2)
#[1] TRUE

#show that col_ind[1:2] always equal 26:
sapply(L, all)

[1]  TRUE  TRUE FALSE FALSE FALSE FALSE

性能

最后,我们仅评估了479个排列中的130万个,并且仅对550 MB RAM进行了改组。运行大约需要0.7s

# A tibble: 1 x 13
  expression   min median `itr/sec` mem_alloc `gc/sec` n_itr  n_gc
  <bch:expr> <bch> <bch:>     <dbl> <bch:byt>    <dbl> <int> <dbl>
1 new_algo   688ms  688ms      1.45     550MB     7.27     1     5

幸运星解决方案统计


考虑这一点的好方法。谢谢。
DesertProject

1
我已经+1,希望我能付出更多。这是我最初的想法,但是我的代码变得非常混乱。漂亮的东西!
约瑟夫·伍德

1
此外,除了整数分区(在我们的情况下为合成)之外,我还使用图形/网络方法进行娱乐。这里肯定有一个图形组件,但是同样,我无法取得任何进展。我认为以某种方式将整数组合与图形结合使用可以使您的方法更上一层楼。
约瑟夫·伍德

3

在此处输入图片说明

这是小家伙的解决方案:

numbersToDrawnFrom = 1:12
bling=0

while(T==T){

  bling=bling+1
  x=sample(numbersToDrawnFrom,12,replace = F)

  A<-x[1]+x[2]+x[3]+x[4] == 26
  B<-x[4]+x[5]+x[6]+x[7] == 26
  C<-x[7] + x[8] + x[9] + x[1] == 26
  D<-x[10] + x[2] + x[9] + x[11] == 26
  E<-x[10] + x[3] + x[5] + x[12] == 26
  F1<-x[12] + x[6] + x[8] + x[11] == 26

  vectorTrue <- c(A,B,C,D,E,F1)

  if(min(vectorTrue)==1){break}
  if(bling == 1000000){break}

}

x
vectorTrue

“我试图向我的儿子展示如何使用编码来解决游戏带来的问题,以及了解R如何处理大数据。” ->是的。至少有1个解决方案符合预期。但是,可以通过重新运行数据找到更多解决方案。
豪尔赫·洛佩兹

快速解决方案来解决这个问题-非常感谢!
DesertProject
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.