search for: ds2

Displaying 20 results from an estimated 59 matches for "ds2".

Did you mean: ds
2008 Apr 01
2
Applying rbind() to a sequence of data frame names
I have a set of data frames ds1, ds2, ... each having the same columns and column names: ds1 <- data.frame(x=c(1,2,3,4), y=c(5,6,7,8)) ds1 <- data.frame(x=c(9,10,11,12), y=c(13,14,15,16)) ... and I would like to combine them into just one data frame like ds <- rbind(ds1, ds2, ...) Because there are so many of them...
2005 May 18
1
from list to dataframe
I was wondering if someone can help me figure out the following: I have two patient datasets, ds1 and ds2. ds1 has fields "patid", "date", and "lab1". ds2 has "patid", "date", and "lab2". I want to find all the patids that have at least 2 dated records for each lab. I started by splitting each dataset by patid, to create ds1.list and ds...
2007 Sep 03
3
plotting predicted curves with log scale in lattice
...t might be clearer why... Here is a toy example illustrating the behavior (there may be a more efficient way to do this), ds1 <- data.frame( RR = rep(seq(0, 1, len = 5)^2, 2) + rnorm(10, sd = 0.1), LL = rep(10^seq(1, 5), 2), FF = factor(rep(letters[1:2], each = 5)) ) ds2 <- data.frame(RR = rep(seq(0, 1, len = 20)^2, 2), LL = rep(10^seq(1, 5, len = 20), 2), FF = factor(rep(letters[1:2], each = 20)) ) library(lattice) xyplot(RR ~ LL | FF, ds1, scales = list(x = list(log = TRUE)), aspect = "xy", subscripts = TRUE, ID = ds2$FF,...
2009 Sep 28
6
SAS user now converting to R - Help with Transpose
...hemicals.... I would like to transpose my data so that it looks like this: Chemical WellID Value BOD Well1 13.2 BOD Well2 14.2 BOD Well3 15.5 BOD Well4 14.2 O2 Well1 7.8 O2 Well2 2.6 .... and so on In sas I would code it like this: proc sort data=ds1; by chemical; run; Proc Transpose data=ds1 out=ds2; by chemical; var Well1 Well2 Well3 Well4; run; data ds3; set ds2; rename _name_ = WellID; rename col1 = value; run; How can I do this in R?? Any help is much appreciated. Thanks! -- View this message in context: http://www.nabble.com/SAS-user-now-converting-to-R---Help-with-Transpose-tp2564539...
2009 Dec 31
1
xyplot - help with multiple Y's vs. X of a member data in multiple panels
Dear R experts, Wish you all a HAPPY NEW YEAR! How do I go about plotting (using lattice) overlays of an ID (group=ID) observed, fitted data in each panel of a multiple panel plot (each panel identified by DS1 + DS2 + DS3)? "x" variable is X1 in the accompanying section of a dataset. each individual is identified by color and Y's are identified by "pch" or "lty". I guess the code goes something like the one below, but could not get the proper use of panel functions.... xyplo...
2006 Mar 23
17
Poor performance on NFS-exported ZFS volumes
...that I can only do NFSv2 mounts... irregardless of that aspect, I''m sure something''s amiss. I mounted the zfs-based nfs share on the linux host and tested it like so and ran tests with dd: --------------- [root at hercules]/>mount -o rw,vers=2,hard,intr,rsize=8192,wsize=8192 ds2.rs:/ds-store/rs/test /umbc/test [root at hercules]/>time dd if=/dev/zero of=/umbc/test/testfile1 bs=16k count=16384 16384+0 records in 16384+0 records out real 170m51.619s user 0m0.060s sys 0m5.720s --------------- Ooof. 170 minutes to write a 256MB file. Sanity-check time, lets try...
2005 Nov 18
0
Likely cause of error (code=1) in compar.gee/gee
...ee), in R version 2.2.0 on a Windows XP PC. I'm looking to model the relationship between a continuous explanatory variable and a binary response variable for 600 species, taking into account the phylogeny of those species. Here's an example of the code used: model.range<compar.gee(DS2$thr.vs.non.thr~DS2$log.range,family="binomial ",phy=pruned.di.tree,scale.fix=FALSE) (where "DS2$thr.non.thr" is a binary response variable, and "DS2$log.range" is a continuous explanatory variable). When I run the function, a model summary is produced, but so is foll...
2010 Apr 26
5
How to make legend with line+ character
...attern '-a-', instead the letter is overwritten by the line. A simpler legend with only the letter is not very visible and the pt.bg does nothing with letters. Any idea? plot(1:10,10:1,lty=1,type='b', lwd=2,pch='a') legend("left", legend=c("ds1","ds2"), bty='n', col=1:2, lty=2,lwd=4,pch=letters) Thanks for your help! mario -- Ing. Mario Valle Data Analysis and Visualization Group | http://www.cscs.ch/~mvalle Swiss National Supercomputing Centre (CSCS) | Tel: +41 (91) 610.82.60 v. Cantonale Galleria 2, 6928...
2012 Mar 21
1
nlme error on dimensions in multiplication
...ror.RData") load(file=con) #ds1, fm1, ctrl close(con) ds1 <- subset(ds1, select=c("ColNoM","minT","resp")) head(ds1) plot( resp ~ minT, col=rainbow(length(unique(ColNoM)))[ColNoM], ds1) lines( fitted.values(fm1) ~ minT, ds1 ) # starting values from glns fit ds2 <- ds1 # ds2 <- unique(ds1) # does not resolve the error tmp.fit1 <- nlme( resp ~ exp(beta0l) + beta1 * exp(-exp(beta2l)*minT) ,fixed=list(beta0l+beta1+beta2l~1) ,random= beta0l ~ 1 | ColNoM , weights =varPower(fixed=0.4, form=~resp) , start=list(fixed = coef(fm1)) #, method='R...
2010 Jan 24
2
fetching columns from another file
Hi! All, I am trying to fetch rows from a data frame which matches to first 2 columns of another data frame. Here is the example what I am trying to do: > ptable=read.table(file="All.txt",header=T,sep="\t") > ptable=as.matrix(ptable) > dim(ptable) [1] 9275 6 > head(ptable) Gene1 Gene2 PCC PCC3 PCC23 PCC123 [1,]
2011 May 17
2
reshaping issue
Dear R users, I have a problem with reshaping data. I know such questions have been asked before, but I can't get it right, neither with the reshape function nor with the melt function. My dataset has about 407 variables and about 48000 cases. Each case looks as follows: V1 v2 v3 v4 v5 v6 v7 x1 y1 x2 y2 .... x200 y200 V1 is unique, v2-v7 are
2001 Jun 02
2
inout() in splancs working properly?
...(convex hull) ds1 <- as.points(rnorm(10),rnorm(10)) ds1.poly <- ds1[chull(ds1),] # plot area within convex hull plot(ds1, type="n") polymap(ds1.poly, border="lightblue", col="lightblue", lwd=1) # Next dataset in and out of first one ds2 <- as.points(rnorm(100),rnorm(100)) points(ds2[inout(ds2,ds1.poly),], col="green", pch=20) points(ds2[!inout(ds2,ds1.poly),], col="orange", pch=20) points(ds1[inout(ds1,ds1.poly),], col="black", pch=20) points(ds1[!inout(ds1,ds1.poly),], col=&q...
2011 Aug 15
1
2 matrix scatter x [a lot]
Hello, I'm pretty new to R. Basically, how do I speed up the for loop below. Or better yet, get rid of the for loop all together. objective: plot two data sets column against column by index. These data sets have alot NA's. Some columns are all NA's. I need the plots to overlay. I don't like the plots in matplot(). Needs to be much faster than the code below... #simple sample
2008 Mar 17
1
[Bug 782] New: zfs keysource=raw fails with keyscope= dataset when file doesn''t exist
...AssignedTo: darrenm at opensolaris.org ReportedBy: darrenm at opensolaris.org QAContact: hua.tang at sun.com CC: zfs-crypto-discuss at opensolaris.org Estimated Hours: 0.0 # zfs create -o encryption=aes-256-ccm -o keyscope=dataset -o keysource=raw,file:///ds2.key tank/ds2 cannot open /ds2.key free(80d6c98): invalid or corrupted buffer stack trace: libumem.so.1''umem_err_recoverable+0x39 libumem.so.1''process_free+0xe1 libumem.so.1''free+0x17 libzfs.so.1''zfs_crypto_create+0x1c3 libzfs.so.1''zfs_create+0x25c zfs...
2011 Apr 01
1
Node Recovery locks I/O in two-node OCFS2 cluster (DRBD 8.3.8 / Ubuntu 10.10)
...e working great, except during testing of hard-boot scenarios. Whenever I hard-boot one of the nodes, the other node is successfully fenced and marked ?Outdated? * <resource minor="0" cs="WFConnection" ro1="Primary" ro2="Unknown" ds1="UpToDate" ds2="Outdated" /> However, this locks up I/O on the still active node and prevents any operations within the cluster :( I have even forced DRBD into StandAlone mode while in this state, but that does not resolve the I/O lock either. * <resource minor="0" cs="StandAlone&...
2012 Apr 15
7
[Bug 48742] New: fbotexture -arb misrenders on nv43
https://bugs.freedesktop.org/show_bug.cgi?id=48742 Bug #: 48742 Summary: fbotexture -arb misrenders on nv43 Classification: Unclassified Product: Mesa Version: git Platform: x86 (IA32) OS/Version: Linux (All) Status: NEW Severity: normal Priority: medium Component: Drivers/DRI/nouveau
2007 Jul 18
0
multicollinearity in nlme models
I am working on a nlme model that has multiple fixed effects (linear and nonlinear) with a nonlinear (asymptotic) random effect. asymporig<-function(x,th1,th2)th1*(1-exp(-exp(th2)*x)) asymporigb<-function(x,th1b,th2b)th1b*(1-exp(-exp(th2b)*x)) mod.vol.nlme<-nlme(fa20~(ah*habdiv+ads*ds+ads2*ds2+at*trout)+asymporig(da.p,th1,th2)+ asymporigb(vol,th1b,th2b), fixed=ah+ads+ads2+at+th1+th2+th1b+th2b~1, random=pdBlocked(list(th1~1,th2~1)), start=c(ah=.5524,ads=.8,ads2=-.1,at=-1,th1=2.542,th2=-7.117,th1b=2,th2b=-7), data=pca1.grouped,verbose=T) I am looking at potential m...
2006 Jul 31
20
ZFS vs. Apple XRaid
Hello all, After setting up a Solaris 10 machine with ZFS as the new NFS server, I''m stumped by some serious performance problems. Here are the (admittedly long) details (also noted at http://www.netmeister.org/blog/): The machine in question is a dual-amd64 box with 2GB RAM and two broadcom gigabit NICs. The OS is Solaris 10 6/06 and the filesystem consists of a single zpool stripe
2003 Nov 15
2
[patch] 3.7.1p2: slogin symlink fixes
...ty of symlinks is tested and the installation command is rewritten to work even with hardlinks. It works for me. Please apply. Maciej -- + Maciej W. Rozycki, Technical University of Gdansk, Poland + +--------------------------------------------------------------+ + e-mail: macro at ds2.pg.gda.pl, PGP key available + openssh-3.6.1p2-symlink.patch diff -up --recursive --new-file openssh-3.6.1p2.macro/Makefile.in openssh-3.6.1p2/Makefile.in --- openssh-3.6.1p2.macro/Makefile.in 2003-04-29 09:12:08.000000000 +0000 +++ openssh-3.6.1p2/Makefile.in 2003-05-06 20:55:54.000000000...
2007 Jun 20
1
nlme correlated random effects
I am examining the following nlme model. asymporig<-function(x,th1,th2)th1*(1-exp(-exp(th2)*x)) mod1<-nlme(fa20~(ah*habdiv+ad*log(d)+ads*ds+ads2*ds2+at*trout)+asymporig(da.p,th1,th2), fixed=ah+ad+ads+ads2+at+th1+th2~1, random=th1+th2~1, start=c(ah=.9124,ad=.9252,ads=.5,ads2=-.1,at=-1,th1=2.842,th2=-6.917), data=pca1.grouped) However, the two random effects (th1 and th2) which describe the asymptotic relationship between ric...