用于生成随机密码的函数

时间:2014-03-06 08:32:53

标签: r string random

我想为具有以下功能的员工生成随机密码。这是我第一次尝试使用R中的函数。所以我需要一些帮助。

genPsw <- function(num, len=8) {
          # Vorgaben für die Passwortkonventionen festlegen
            myArr  <- c("", 2, 3, 4, 5, 6, 7, 8, 9, "A", "B", 
                        "C", "D", "E", "F", "G", "H", "J", "K", "L", "M", 
                        "N", "P", "Q", "R", "S", "T", "U", "V", "W", "X", "Y", "Z", 
                        "a", "b", "c", "d", "e", "f", "g", "h", "i", "j", "k", "l", "m", "n", "o",
                        "p", "q", "r", "s", "t", "u", "v", "w", "x", "y", "z", 
                        "!", "§", "$", "%", "&", "(", ")", "*")
          # replicate is a wrapper for the common use of sapply for repeated evaluation of an expression 
          # (which will usually involve random number generation).
            replicate(num, paste(sample(myArr, size=len, replace=T), collapse=""))
          # nrow of dataframe mitarbeiter 
          dim_mitarbeiter <- nrow(mitarbeiter)
          for(i in 1:dim_mitarbeiter) {
                        # Random Number Generation with i
                          set.seed(i)
                        # Generate Passwort for new variable password
                        mitarbeiter$passwort <- genPsw(i)                
          }

}

使用Floo0的答案形式我已将功能更改为类似的东西,但它不起作用:

genPsw <- function(num, len=8) {
          # Vorgaben für die Passwortkonventionen festlegen
          sam<-list()
          sam[[1]]<-1:9
          sam[[2]]<-letters
          sam[[3]]<-LETTERS
          sam[[4]]<-c("!", "§", "$", "%", "&", "(", ")", "*")

          # nrow of dataframe mitarbeiter 
          dim_mitarbeiter <- nrow(mitarbeiter)
          for(i in 1:dim_mitarbeiter) {
                        # Random Number Generation with i
                            tmp<-mapply(sample,sam,c(2,2,2,2))
                         # Generate Passwort for new variable password
                        mitarbeiter$passwort <- paste(sample(tmp),collapse="")
          }

}

6 个答案:

答案 0 :(得分:13)

怎么样?
samp<-c(2:9,letters,LETTERS,"!", "§", "$", "%", "&", "(", ")", "*")
paste(sample(samp,8),collapse="")

结果是这样的

"HKF§VvnD"

注意: 此approch不强制使用大写字母,数字和非字母数字符号

修改

如果你想强制执行一定数量的大写字母,数字和非字母数字符号,你可以使用它:

sam<-list()
sam[[1]]<-1:9
sam[[2]]<-letters
sam[[3]]<-LETTERS
sam[[4]]<-c("!", "§", "$", "%", "&", "(", ")", "*")

tmp<-mapply(sample,sam,c(2,2,2,2))
paste(sample(tmp),collapse="")

其中c(2,2,2,2)指定数字,字母,大写字母和共体(按此顺序)的数量。结果:

[1] "j$bP%5R3"

<强> EDIT2: 要在表mitarbeiter中生成新列,只需使用

passwort<-replicate(nrow(mitarbeiter),paste(mapply(sample,sam,c(2,2,2,2)),collapse=""))
mitarbeiter$passwort<-passwort

答案 1 :(得分:7)

有一个函数可以在stringi包中生成随机字符串:

require(stringi)
stri_rand_strings(n=2, length=8, pattern="[A-Za-z0-9]")
## [1] "90i6RdzU" "UAkSVCEa"

答案 2 :(得分:3)

这可能有用,可能需要更改ASCII以避免不需要的符号:

generatePwd <- function(plength=8, ASCII=c(33:126)) paste(sapply(sample(ASCII, plength), function(x) rawToChar(as.raw(x))), collapse="")

答案 3 :(得分:1)

以下脚本使用大写和小写字母,数字和32个符号(标点符号等)的组合创建指定长度的密码。

# Store symbols as a vector in variable punc
R> library(magrittr) # Load this package to use the %>% (pipe) operator
R> punc_chr <- "!#$%&’()*+,-./:;<=>?@[]^_`{|}~" %>%
     str_split("", simplify = TRUE) %>%
     as.vector() -> punc

# Randomly generate specified number of characters from 94 characters
R> sample(c(LETTERS, letters, 0:9, punc), 8) %>%
     paste(collapse = "") -> pw
R> pw # Return password
[1] "fAXVpyOs"

答案 4 :(得分:0)

我喜欢L.R。解决方案的简洁,尽管我不会100%遵循它的做法。

我的解决方案允许指定密码的长度,但也确保包含至少一个小写,一个大写,一个数字和一个特殊字符,并允许再现性。 (ht to moazzem拼写出所有特殊字符。)

gen_pass <- function(len=8,seeder=NULL){
  set.seed(seeder) # to allow replicability of passw generation
 # get all combinations of 4 nums summing to length len
  all_combs <- expand.grid(1:(len-3),1:(len-3),1:(len-3),1:(len-3))
  sum_combs <- all_combs[apply(all_combs, 1, function(x) sum(x)==len),]
 # special character vector
  punc <- unlist(strsplit("!#$%&’()*+,-./:;<=>?@[]^_`{|}~",""))
 # list of all characters to sample from
  chars <- list(punc,LETTERS,0:9,letters)
 # retrieve the number of characters from each list element 
 # specified in the sampled row of sum_combs
  pass_chars_l<- mapply(sample, chars,
                        sum_combs[sample(1:nrow(sum_combs),1),],
                        replace = TRUE)
 # unlist sets of password characters 
  pass_chars <- unlist(pass_chars_l)
 # jumble characters and combine into password 
  passw <- str_c(sample(pass_chars),collapse = "")
 return(passw)
}

我仍然想知道如何更优雅地表达(1:(len-3),1:(len-3),1:(len-3),1:(len-3))中的expand.grid(1:(len-3),1:(len-3),1:(len-3),1:(len-3))

答案 5 :(得分:0)

我刚刚尝试了Fmerhout提出的功能。这似乎是一个很好的解决方案。非常感谢。但是由于最后一行代码:

    passw <- str_c (sample (pass_chars), collapse = "")    

该功能不起作用。 我尝试过:

    passw <- str (sample (pass_chars), collapse = "")     

...现在可以使用了

带有种子的示例:

    >gen_pass(4,2)

给出:chr [1:4]“ y”“ [”“ O”“ 1”

为了获得可直接使用的密码,我以这种方式更改了代码的结尾:

    zz <- sample(pass_chars)
    passw <- paste(zz, sep = "", collapse = "")
    return(passw)
    }

所以,现在我们举个例子:

    > gen_pass(35, 2)
    [1] "0OD}1O}8DKMqTL[JEFZBwKMJWGD’VZ=VRnD"

这很有趣;因为我们只需要记住传递给函数的参数即可。在这里,在这种情况下:35 2。 谢谢Fmerhout先生

总结:使用这个小脚本,我们有一个很好的方法来创建具有良好熵的非常强大和非常安全的密码,而不必使用字典,也不必在任何地方记录我们的密码。