blob: 4d8f72314d3e73f8490028e31b96b21da0320ad9 [file] [log] [blame]
# File src/library/methods/R/rbind.R
# Part of the R package, https://www.R-project.org
#
# Copyright (C) 1995-2018 The R Core Team
#
# This program is free software; you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
# the Free Software Foundation; either version 2 of the License, or
# (at your option) any later version.
#
# This program is distributed in the hope that it will be useful,
# but WITHOUT ANY WARRANTY; without even the implied warranty of
# MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
# GNU General Public License for more details.
#
# A copy of the GNU General Public License is available at
# https://www.R-project.org/Licenses/
#### S4-ized rbind() --- this is entirely parallel to ./cbind() --- KEEP IN SYNC!
### -------------------- built by
## s/cbind/rbind/ ; s/nrow/N_COL/; s/column/row/; s/colnam/rownam/;
## s/ncol/nrow/ ; s/N_COL/ncol/; s/d[2L]/d[1L]/
rbind <- function(..., deparse.level = 1)
{
has.dl <- !missing(deparse.level)
deparse.level <- as.integer(deparse.level)
if(identical(deparse.level, -1L)) deparse.level <- 0L # our hack
stopifnot(0 <= deparse.level, deparse.level <= 2)
argl <- list(...)
## remove trailing 'NULL's:
na <- nargs() - has.dl
while(na > 0L && is.null(argl[[na]])) { argl <- argl[-na]; na <- na - 1L }
if(na == 0) return(NULL)
symarg <- as.list(substitute(list(...)))[-1L] # symbolic argument (names)
nmsym <- names(symarg)
## Give *names* depending on deparse.level {for non-matrix}:
nm <- c( ## 0:
function(i) NULL,
## 1:
function(i) if(is.symbol(s <- symarg[[i]])) deparse(s) else NULL,
## 2:
function(i) deparse(symarg[[i]])[[1L]])[[ 1L + deparse.level ]]
Nms <- function(i) { if(!is.null(s <- nmsym[i]) && nzchar(s)) s else nm(i) }
if(na == 1) {
if(isS4(..1)) {
r <- rbind2(..1)
if(length(dim(..1)) < 2L && length(dim(r)) == 2L)
rownames(r) <- Nms(1)
return(r)
}
else return(base::rbind(..., deparse.level = deparse.level))
}
## else : na >= 2
if(na == 2) {
fix.na <- FALSE
}
else { ## na >= 3 arguments
## determine ncol(<result>) for e.g., rbind(diag(2), 1, 2)
## only when the last two argument have *no* dim attribute:
nrs <- unname(lapply(argl, ncol)) # of length na
iV <- vapply(nrs, is.null, NA)# is 'vector'
fix.na <- identical(nrs[(na-1L):na], list(NULL,NULL))
if(fix.na) {
## "fix" last argument, using 1-row `matrix' of proper ncol():
nr <- max(if(all(iV)) lengths(argl) else unlist(nrs[!iV]))
argl[[na]] <- rbind(rep(argl[[na]], length.out = nr),
deparse.level = 0)
## and since it's a 'matrix' now, rbind() below may not name it
}
## if(deparse.level) {
if(fix.na)
fix.na <- !is.null(Nna <- Nms(na))
## }
}
Nrow <- function(x) {
d <- dim(x); if(length(d) == 2L) d[1L] else as.integer(length(x) > 0L) }
setN <- function(i, nams)
rownames(r)[i] <<- if(is.null(nams)) "" else nams
r <- argl[[na]]
for(i in (na-1L):1L) {
d2 <- dim(r)
r <- rbind2(argl[[i]], r)
## if(deparse.level == 0)
## if(i == 1L) return(r) else next
ism1 <- !is.null(d1 <- dim(argl[[i]])) && length(d1) == 2L
ism2 <- !is.null(d2) && length(d2) == 2L
if(ism1 && ism2) ## two matrices
next
## else -- Setting rownames correctly
## when one was not a matrix [needs some diligence!]
nn1 <- !is.null(N1 <- if( (l1 <- Nrow(argl[[i]])) && !ism1) Nms(i)) # else NULL
nn2 <- !is.null(N2 <- if(i == na-1L && Nrow(argl[[na]]) && !ism2) Nms(na))
if(nn1 || nn2) {
if(is.null(rownames(r)))
rownames(r) <- rep.int("", nrow(r))
if(nn1) setN(1, N1)
if(nn2) setN(1+l1, N2)
}
}
if(fix.na) {
if(is.null(rownames(r)))
rownames(r) <- rep.int("", nrow(r))
setN(nrow(r), Nna)
}
r
}