search for: tst1

Displaying 20 results from an estimated 25 matches for "tst1".

Did you mean: ts1
2010 Jun 17
2
Multiple plots in a single page and stripplot()
I want to make a 2x2 plot on a single page, using stripplot() and boxplot(). I tried the following two alternatives with mfrow() and layout(), but none of them worked. library(lattice) par(mfrow=c(2,2)) boxplot(X1 ~ Y, data=tst1, horizontal=T, las=1) boxplot(X2 ~ Y, data=tst1, horizontal=T, las=1) stripplot(Y ~ X1, data=tst1) stripplot(Y ~ X2, data=tst1) par(mfrow=c(1,1)) nf <- layout(matrix(c(1,2,3,4), 2, 2, byrow=TRUE)) layout.show(nf) boxplot(X1 ~ Y, data=tst1, horizontal=T, las=1) boxplot(X2 ~ Y, data=tst1, horizon...
2010 May 07
3
[LLVMdev] AsmPrinter behavior
I compile these two lines in llc @tst1 = internal global [4 x i8] zeroinitializer; @tst2 = internal global [4 x i8] [i8 0, i8 1, i8 2, i8 3]; @tst1 is emited via MCStreamer::EmitCommonSymbol while the other is emited via MCStreamer::EmitLabel followed by MCStreamer::EmitBytes from what I can tell, only symbols with common linkage shou...
2009 Jun 13
1
Hmisc summarize() with level "" in by variable
...to report it as a bug, but I could not log into the Hmisc bug reporting website to do so. I searched for this in the email archives. If it's there, I failed to find it. Should I try to pursue this as a bug, or am I using summarize incorrectly? Here is my example along with the output: > tst1 <- data.frame(a=factor(c("", "A", "B", "C")), + x=1:4) > tst1 a x 1 1 2 A 2 3 B 3 4 C 4 > with(tst1, summarize(x, by=llist(a), FUN=mean)) a x 1 A 1 2 B 2 3 C 3 > with(tst1, aggregate(x, by=list(a), FUN=mean)) Group.1 x 1...
2017 Oct 18
2
Can we disable write to /sys/fs/cgroup tree inside container ?
Hi all Each lxc container on node have mounted tmpfs for cgroups tree: [root-inside-lxc@tst1 ~]# mount | grep cgroups cgroup on /sys/fs/cgroup/cpu,cpuacct type cgroup (rw,nosuid,nodev,noexec,relatime,cpuacct,cpu) cgroup on /sys/fs/cgroup/cpuset type cgroup (rw,nosuid,nodev,noexec,relatime,cpuset) cgroup on /sys/fs/cgroup/memory type cgroup (rw,nosuid,nodev,noexec,relatime,memory) cgroup on...
2010 May 07
1
[LLVMdev] AsmPrinter behavior
On May 7, 2010, at 12:39 AM, Nathan Jeffords wrote: > On Fri, May 7, 2010 at 12:03 AM, Chris Lattner <clattner at apple.com> wrote: > > On May 6, 2010, at 10:01 PM, Nathan Jeffords wrote: > > > I compile these two lines in llc > > > > @tst1 = internal global [4 x i8] zeroinitializer; > > @tst2 = internal global [4 x i8] [i8 0, i8 1, i8 2, i8 3]; > > > > @tst1 is emited via MCStreamer::EmitCommonSymbol > > while the other is emited via MCStreamer::EmitLabel followed by MCStreamer::EmitBytes > > > > f...
2007 May 24
4
Function to Sort and test AIC for mixed model lme?
Hi List I'm running a series of mixed models using lme, and I wonder if there is a way to sort them by AIC prior to testing using anova (lme1,lme2,lme3,....lme7) other than by hand. My current output looks like this. anova (lme.T97NULL.ml,lme.T97FULL.ml,lme.T97NOINT.ml,lme.T972way.ml,lme.T97fc. ml, lme.T97ns.ml, lme.T97min.ml) Model df AIC BIC logLik
2009 Mar 27
0
read.table on long lines buggy (PR#13626)
Full_Name: Manikandan Narayanan Version: 2.8.1 OS: linux-gnu Submission from: (NULL) (155.91.28.231) Hi R-folks, I have two three-line text files: tst1, tst2 (they are the same except that the second line is longer in tst1; see cat() cmds below). read.table is only able to read the 3rd line in tst1, however reads tst2 correctly as shown below. This happens both in R 2.5.1 (windows) and R 2.8.1 (linux-gnu). Seems to be an issue with read.ta...
2005 Mar 07
1
Density estimation when an end may not go to zero?
...range of the numbers, then plot only the part that I wanted. The following example supposes simulates observations from a truncated normal with mean 0, standard deviation 1, and only observations above 1.5 are observed and we faked numbers between 1 and 1.5: set.seed(1) tst <- rnorm(1000) tst1 <- tst[tst>1] knl <- density(tst1) sel <- knl$x>1.5 plot(knl$x[sel], knl$y[sel], type="l") Are there any convenient methods for handling this kind of thing currently available in R? Thanks, Spencer Graves
2010 May 07
0
[LLVMdev] AsmPrinter behavior
...7, 2010, at 12:39 AM, Nathan Jeffords wrote: > > On Fri, May 7, 2010 at 12:03 AM, Chris Lattner <clattner at apple.com> wrote: > >> >> On May 6, 2010, at 10:01 PM, Nathan Jeffords wrote: >> >> > I compile these two lines in llc >> > >> > @tst1 = internal global [4 x i8] zeroinitializer; >> > @tst2 = internal global [4 x i8] [i8 0, i8 1, i8 2, i8 3]; >> > >> > @tst1 is emited via MCStreamer::EmitCommonSymbol >> > while the other is emited via MCStreamer::EmitLabel followed by >> MCStreamer::EmitBy...
2008 May 02
1
Speedups with Ra and jit
...ab } > > conv2 <- function(a, b) { > ### with just Ra ab <- numeric(length(a)+length(b)-1) for(i in 1:length(a)) for(j in 1:length(b)) ab[i+j-1] <- ab[i+j-1] + a[i]*b[j] ab } > > x <- 1:2000 > y <- 1:500 > system.time(tst1 <- conv1(x, y)) user system elapsed 0.53 0.00 0.55 > system.time(tst2 <- conv2(x, y)) user system elapsed 9.49 0.00 9.56 > all.equal(tst1, tst2) [1] TRUE > > 9.56/0.55 [1] 17.38182 > However for this example you can achieve speed-ups like that or...
2010 May 07
3
[LLVMdev] AsmPrinter behavior
...ou just put these into the .bss section? > Macho has a special zerofill directive (targeted at the BSS section) for this. You can see this by running your example like this: $ llc t.ll -o - -mtriple=i386-apple-darwin10 .section __TEXT,__text,regular,pure_instructions .zerofill __DATA,__bss,_tst1,4,0 ## @tst1 .section __DATA,__data _tst2: ## @tst2 .ascii "\000\001\002\003" -Chris -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://lists.llvm.org/pipermail/llvm-dev/attachments/20100507/9015a36a/attac...
2003 Mar 15
3
round() seems inconsistent when rounding 5s
It may be my lack of unerstanding, but round() seems to me to give inconsistent results when rounding 5s as in the following examples? > round(1.45, 1) [1] 1.4 # OK > round(2.45, 1) [1] 2.5 # shouldn't this be 2.4? > round(1.05, 1) [1] 1.1 # 1.0 ? and signif(): > signif(2.445, 3) [1] 2.44 # OK > signif(3.445, 3) [1]
2003 Mar 31
4
Convert char vector to numeric table
I'm a great fan of read.table(), but this time the data had a lot of cruft. So I used readLines() and editted the char vector to eventually get something like this: " 23.4 1.5 4.2" " 19.1 2.2 4.1" and so on. To get that into a 3 col numeric table, I first just used: writeLines(data,"tempfile")
2010 May 07
4
[LLVMdev] AsmPrinter behavior
...ction? >> > > Macho has a special zerofill directive (targeted at the BSS section) for this. You can see this by running your example like this: > > $ llc t.ll -o - -mtriple=i386-apple-darwin10 > .section __TEXT,__text,regular,pure_instructions > .zerofill __DATA,__bss,_tst1,4,0 ## @tst1 > .section __DATA,__data > _tst2: ## @tst2 > .ascii "\000\001\002\003" > > I think we should have an 'EmitZeroFill()' and 'EmitASCII()' OutStream methods, the latter to deal with dllexports in 'lib...
2010 May 07
0
[LLVMdev] AsmPrinter behavior
...section? > > > Macho has a special zerofill directive (targeted at the BSS section) for > this. You can see this by running your example like this: > > $ llc t.ll -o - -mtriple=i386-apple-darwin10 > .section __TEXT,__text,regular,pure_instructions > .zerofill __DATA,__bss,_tst1,4,0 ## @tst1 > .section __DATA,__data > _tst2: ## @tst2 > .ascii "\000\001\002\003" > I think we should have an 'EmitZeroFill()' and 'EmitASCII()' OutStream methods, the latter to deal with dllexports in ' lib/Target...
2009 Apr 08
3
Convert data frame containing time stamps to time series
I read records using scan: dat<-data.frame(scan(file="KDA.csv",what=list(t="%m/%d/%y %H:%M",f=0,p=0,d=0,o=0,s=0,a=0,l=0,c=0),skip=2,sep=",",nmax=np,flush=TRUE,na.strings=c("I/OTimeout","ArcOff-line"))) which results in: > dat[1:5,] t f p d o s a l c 1 1/21/09 5:01 16151 8.2 76 30 282 1060 53 7 2 1/21/09 5:02
2010 May 07
2
[LLVMdev] AsmPrinter behavior
On May 7, 2010, at 11:42 AM, Nathan Jeffords wrote: >> $ llc t.ll -o - -mtriple=i386-apple-darwin10 >> .section __TEXT,__text,regular,pure_instructions >> .zerofill __DATA,__bss,_tst1,4,0 ## @tst1 >> .section __DATA,__data >> _tst2: ## @tst2 >> .ascii "\000\001\002\003" >> >> I think we should have an 'EmitZeroFill()' and 'EmitASCII()' OutStream methods, the latter to deal with dl...
2010 May 07
0
[LLVMdev] AsmPrinter behavior
...gt; Macho has a special zerofill directive (targeted at the BSS section) for >> this. You can see this by running your example like this: >> >> $ llc t.ll -o - -mtriple=i386-apple-darwin10 >> .section __TEXT,__text,regular,pure_instructions >> .zerofill __DATA,__bss,_tst1,4,0 ## @tst1 >> .section __DATA,__data >> _tst2: ## @tst2 >> .ascii "\000\001\002\003" >> > > I think we should have an 'EmitZeroFill()' and 'EmitASCII()' OutStream > methods, the latter to deal with...
2013 Jun 12
2
grDevices::convertColor XYZ space is it really xyY?
grDevices::convertColor has arguments 'from' and 'to' which can take on value 'XYZ'. Can someone confirm that 'XYZ' is the same as the CIE chromaticity coordinates that are also sometimes refered to as 'xyY' in the literature? Or are these the CIE tristimulus values? It looks to me like the first case is true, but I would appreciate hearing from one of
2004 Aug 21
1
err: I have no name (Idmap Ldap)
...ossible to retrieve username for lastlog and session closes). May bee someone had already such problem, and know's solution? There is some illustration of problem: ======= [root@virsis /]# wbinfo -t checking the trust secret via RPC calls succeeded ======= [root@virsis /]# wbinfo -u ...skip tst10 tst11 ...skip ======= [root@virsis /]# getent passwd | grep tst1 tst10:x:20694:30000::/skola/tst10:/bin/bash tst11:x:20695:30000::/skola/tst11:/bin/bash ...skip ======= But! [root@virsis /]# su tst10 Creating directory '/skola/tst10'. Creating directory '/skola/tst10/tmp'. id: can...