search for: clabs

Displaying 20 results from an estimated 37 matches for "clabs".

Did you mean: labs
2007 Jan 12
0
Minor logical bug in rbind.data.frame ?
...b 2 y 3 c 3 x 4 d 4 y 5 a 5 x 6 e 6 z > ## All is fine. ## Third data frame has a different third column variable > fifi <- data.frame(v1 = c('a', 'e'), v2 = c(9, 10), v4 = ordered(c('y', 'z'))) > rbind(foo, bar, fifi) Error in match.names(clabs, names(xi)) : names do not match previous names: v4 > ## Output looks fine. ## Third data frame is missing a column. > gaga <- data.frame(v1 = c('a', 'e'), v2 = c(7, 8)) > rbind(foo, bar, gaga) Error in paste(nmi[nii == 0], collapse = ", ") : object "n...
2006 Dec 02
0
fixup for debug package and R2.4.0
...ing the 'debug' library [so you could put this in your '.First' function]: Thanks to all who reported the problem Mark Bravington mark.bravington at csiro.au mvbutils:::assign.to.base( 'rbind.data.frame', function (..., deparse.level = 1) { match.names <- function(clabs, nmi) { if (all(clabs == nmi)) NULL else if (length(nmi) == length(clabs) && all(nii <- match(nmi, clabs, 0))) { m <- pmatch(nmi, clabs, 0) if (any(m == 0)) stop("names do not match previous names&...
2017 Jun 21
0
customizing color key with plot3D
Karline, Thank you for your help. I discovered that in addition to including clim, I needed to omit breaks. This code uses one of your other examples as a starting point and works as intended: persp3D(z = volcano, zlim = c(-60, 200), phi = 20, colkey = list(length = 0.2, width = 0.4, shift = 0.15, cex.axis = 0.8, cex.clab = 0.85), lighting = TRUE, lphi = 90, clab =
2004 Jun 07
1
Xtable giving an interesting problem
I'm using the current version of xtable for 1.9.0 and I have an interesting error: Error in match.names(clabs, names(xi)) : names don't match previous names: F value, Pr(>F) In addition: Warning message: longer object length is not a multiple of shorter object length in: clabs == nmi This is produced in the following manner: >data.trans <- data.frame(ref=rep(c(3.995,20.003),2),...
2008 Jan 13
1
Trying to write Merge for more data.frames - Error in match.names(clabs, names(xi))
...to be required quite often, so I decided to write a simple (pseudo)recursive merge. I started with the case when dataframes are merged by rows (0). But there is a problem when a dataframe to be merged in the step n has some items that are not in previous ones. Then I get "Error in match.names(clabs, names(xi)) : names do not match previous names". Please help. Thank you Jiri Voller MergeByRownames<-function(x,a,all.x=T,all.y=T){ stopifnot(is.list(x)) x<-lapply(x,as.data.frame,row.names = NULL) ## if (any(unlist(lapply(x, function(x){is.null(rownames(x))})))){stop(&...
2008 Jan 18
2
plotting other axes for PCA
Hi R-community, I am doing a PCA and I need plots for different combinations of axes (e.g., PC1 vs PC3, and PC2 vs PC3) with the arrows indicating the loadings of each variables. What I need is exactly what I get using biplot (pca.object) but for other axes. I have plotted PC2 and 3 using the scores of the cases, but I don't get the arrows proportional to the loadings of each variables on
2007 Mar 05
3
Rbind with data frames -- column names question
...and matrix, the matrix would be coerced and appended, keeping the names from the data frame. Clearly, I am not fully understanding the process by which rbind works. Example code: > A<-data.frame(1,1,1); names(A)=letters[1:3] ; B<-matrix(0,2,3) > rbind(A,B) Error in match.names(clabs, names(xi)) : names do not match previous names: V1, V2, V3 > rbind(A,as.data.frame(B)) Error in match.names(clabs, names(xi)) : names do not match previous names: V1, V2, V3 Is there a "right" way to combine the two such that the both end up having the same column...
2011 Apr 06
1
Error in match.names(clabs, names(xi))
Hi Guys, I have this part of a program: library(survival) Gastric <- cbind.data.frame(Gp=c(rep(1,45),rep(0,45)), ### 2nd gp 0 time=c(1,63,105,129,182,216,250,262,301,301,342,354,356,358, 380,383, 383,388,394,408,460,489,499,523,524,535,562,569,675,676, 748,778,786,797,955,968,1000,1245,1271,1420,1551,1694,2363,2754,2950,
2000 Dec 22
0
par(lab= *) / axis(*) bug (PR#791)
As the subject says, here is example code (with comments) showing the problem: p1 <- function(lab = c(8,12,7)) { ## This `fails' (on a virgin device) clab <- paste(lab,collapse=",") plot(1,1, xlim = c(0,15), ylim = c(-.8,1), type ="n", axes = FALSE, main=paste("plot(*,axes=F); par(lab= c(",clab,")); axis(*) x
2017 Jun 21
0
customizing color key with plot3D
Hi, I am doing composite plots with the package plot3D. One of my variables is qualitative and indexed to integers, and I would like the legend for it to have labels located at the integer values (midpoints), and not at the breaks between classes. In the example below, the Elev Classes legend has labels at the breaks and nothing at the midpoints. How can I show the class labels at 1:3, and not
2003 Apr 25
2
Posix data in Lattice
I have a number of plots that I'm trying to do using the lattice package, unfortunately, they involve Posix values. A small sample of the data is as follows: Time TC.1 <Snipped> 1 2003-04-24 13:29:15 26.61 2 2003-04-24 13:29:30 26.48 3 2003-04-24 13:30:00 26.53 4 2003-04-24 13:30:30 27.85 <Snipped> where str(data) `data.frame': 415 obs. of
2002 May 03
2
merge (PR#1510)
...=c("nation","eyear","mvoteint"), by.y=c("nation","year","mecode"), all.x=TRUE, sort=TRUE ) Error message: Error in match.names(clabs, names(xi)) : names don't match previous names: year, mecode Traceback: 10: stop(paste("names don't match previous names:\n ", paste(nmi[nii == 0], collapse = ", "))) 9: match.names(clabs, names(xi)) 8: rbind(...) 7: rbind(x[, by.x], y[, by.y]) 6...
2006 Apr 06
1
rbind
Hi list, I have been trying to pileup dataframes with different column names using rbind. I am getting the following error message. I was wondering if there is a way to go around this minor problem? Error in match.names(clabs, names(xi)) : names don't match previous names: G Thanks indeed for your information Regards Mahdi -- ----------------------------------- Mahdi Osman (PhD) E-mail: m_osm at gmx.net ----------------------------------- Echte DSL-Flatrate dauerhaft f?r 0,- Euro*!
2006 May 03
2
mca id numbers
Is it possible to make disappear the id numbers from scatter.dudi (mc analysis) ? a <- as.factor(c(1, 2, 3, 2, 1)) b <- as.factor(c(3, 2, 3, 1, 1)) x <- as.factor(c(1, 2, 2, 1, 3)) y <- as.factor(c(2, 2, 3, 1, 1)) dat <- data.frame(a=a, b=b,x=x,y=y) summary(dat) dat require(ade4) dat.acm <- dudi.acm(dat, scann = FALSE, nf = 2) scatter.dudi(dat.acm) Thank you very much !
2012 Aug 23
3
Concatenating data frames in R versus SAS
I am trying to concatenate 2 datasets that don't have exactly the same column. In SAS I did: data summary; set agency prop; run; No problem in R I get error message summary <-rbind(agency,prop) Error in match.names(clabs, names(xi)) : names do not match previous names But when I use rbin.fill, that overwrites the second file w/ first one. Is there a way to replicate the sas process in R? Thanks in advance -- View this message in context: http://r.789695.n4.nabble.com/Concatenating-data-frames-in-R-versus-SA...
2004 Apr 30
2
rbind with missing columns
Hello, I have several data sets, which I want to combine column-by-column using "rbind" (the data sets have ~100 columns). The problem is, that in some data sets some of the columns are missing. Simply using rbind gives me: "Error in match.names(clabs, names(xi)) : names don't match previous names" Is there a simple way to make R do the rbind despite the missing columns and to fill out the missing data with NA's? (I could program this somehow, but probably there is one very simple solution available) To make it clear here a simpli...
2008 Feb 10
2
View() + "End" key on Ubuntu=segfault
I can repeatably crash R (segfault) by doing n <- 10 z <- data.frame(a=1:n,b=1:n) View(z) and then hitting the "End" key on my keyboard. I haven't got debugging going yet, but running under gdb (without debugging symbols) does give this: 0xb7b63583 in strlen () from /lib/tls/i686/cmov/libc.so.6 R version 2.6.2 (2008-02-08) i486-pc-linux-gnu [Ubuntu Gutsy] locale:
2012 Jan 11
3
turning a list of vectors into a data.frame (as rows of the DF)?
...the recycling rule (expectedly) reclycles 1,2 versus using NAs as placeholders.   Then, looking into Teetor's R Cookbook, there is a piece of code that looked (from the description) like it might do the trick:   do.call(rbind, Map(as.data.frame,lst1)   But I get the error: Error in match.names(clabs, names(xi)) :   names do not match previous names   Thinking the source of the error had to do with the vectors of unequal lenght, I tried Hadley's rbind.fill thusly:   library(reshape) do.call(rbind.fill, Map(as.data.frame,lst1)   Which produced a dataset, but gain, not in the desired format....
2023 Apr 09
1
extracting pdf tables...
..._tables("https://www.canmoney.in/pdf/INTRADAYLEVERAGE-20220531-latest.pdf",output = "data.frame") It returns 4 different data frames which I want to combine them and make one data frame. But when I run this: > rbind(IDT[[1]],IDT[[2]],IDT[[3]],IDT[[4]]) Error in match.names(clabs, names(xi)) : names do not match previous names Also: > class(IDT[[1]]) [1] "data.frame" > cbind(IDT[[1]],IDT[[2]],IDT[[3]],IDT[[4]],make.row.names = FALSE) Error in data.frame(..., check.names = FALSE) : arguments imply differing number of rows: 55, 56, 30, 1 Can anyone please...
2010 Feb 01
1
problem withrbind function
Hi all, I am trying to to merge two data.frames(kk and ff) like > kk a b d 1 1 4 7 2 2 5 8 3 3 6 9 > ff a b d 1 2 5 8 2 3 6 9 3 4 7 1 and g<-rbind(kk,ff) is working perfectly and giving results but if any of the column name changed then its giving "Error in match.names(clabs, names(xi)) : names do not match previous names" like > kk a b d 1 1 4 7 2 2 5 8 3 3 6 9 > ff a b f 1 2 5 8 2 3 6 9 3 4 7 1 and g<-rbind(kk,ff) can any one suggest how can I bind by rows or is there any way to change the column name in any date frame this one also heps...