我想爲R中的數字生成sequential citation numbers。如果數字是連續的,則應該用連字符分隔數字。否則,數字用逗號分隔。例如,號碼1, 2, 3, 5, 6, 8, 9, 10, 11 and 13
應該出現爲1-3,5,6,8-11,13
。R中的連續引用編號:連字符中的單獨數字,如果順序 - 如果不是,則添加逗號
這個問題已經被previously answered for c#了,我寫了一個適用於R的函數,但是這個函數可以改進。我發佈這個問題作爲其他可能有類似需求的參考。如果您發現R(我沒有)的類似問題,請投票結束,我將刪除該問題。
下面的功能不是很優雅,但似乎做的工作。 如何使功能更短,更優雅?
x <- c(1,2,3,5,6,8,9,10,11,13)
library(zoo) ## the function requires zoo::na.approx function
##' @title Generate hyphenated sequential citation from an integer vector
##' @param x integer vector giving citation or page numbers
##' @importFrom zoo na.approx
seq.citation <- function(x) {
## Result if lenght of the integer vector is 1.
if(length(x) == 1) return(x) else {
## Sort
x <- sort(x)
## Difference
df <- diff(x)
## Index to determine start and end points
ind <- c("start", rep("no", length(df)-1), "end")
ind[which(df > 1)] <- "end"
## Temporary start point vector
sts <- which(ind == "end") + 1
ind[sts[sts < length(ind)]] <- "start"
## Replace the first index element
ind[1] <- "start"
## Replace the last index element, if preceding one is "end"
if(ind[length(ind)-1] == "end") ind[length(ind)] <- "start"
## Groups for comma separation using "start" as the determining value.
grp <- rep(NA, length(x))
grp[which(ind == "start")] <- 1:length(grp[which(ind == "start")])
grp <- zoo::na.approx(grp, method = "constant", rule = 2)
## Split sequences by group
seqs <- split(x, grp)
seqs <- lapply(seqs, function(k) {
if(length(k) == 1) k else {
if(length(k) == 2) paste(k[1], k[2], sep = ",") else {
paste(k[1], k[length(k)], sep = "-")
}}
})
## Result
return(do.call("paste", c(seqs, sep = ",")))
}
}
seq.citation(x)
# [1] "1-3,5,6,8-11,13"
還參見,類似的[交](https://stackoverflow.com/questions/34636461/function-to-summarize - 數字的向量 - 字符串) –