search for: 6,6

Displaying 20 results from an estimated 408 matches for "6,6".

Did you mean: 1,6
2010 Jul 07
1
xyplot of function only shows diagonal plots
...me = canonical.theme("Windows")) x <- seq(-4,4, by=0.1) # case 1x1 a <- c( 1 ) b <- c( 3 ) trel_1 <- xyplot(f(x,a,b) ~ x | a * b, , type = "l", main = "1x1", ylab = "f(x)", xlab = "x", xlim = c(-6,6), ylim = c(-6,6), ) # case 3x3 a <- c(1,2,3) b <- c(1,2,3) trel_3 <- xyplot(f(x,a,b) ~ x | a * b, , type = "l", main = "3x3", ylab = "f(x)", xlab = "x", xlim = c(-6,6), ylim = c(-6,6), ) p...
2004 Apr 23
4
Tcl Tk table
....Tcl(paste("set tclArray(",i,",",j,") ",myRarray[i+1,j+1],sep="")) tt<-tktoplevel() table1 <- tkwidget(tt,"table",variable="tclArray", rows="50", cols="50") tkpack(table1) #Old version which worked in R 1.6 but it doesn't work with R 1.9 (and also not with 1.8), why?? tkcmd(.Tk.ID(table1),"tag","celltag","gruen",list(c("3,3", "4,4", "5,5", "6,6", "7,7", "8,8"))) tkcmd(.Tk.ID(table1),"tag","conf...
2004 Sep 13
1
do.call("dim<-" , ... )
...x to make a matrix "y" with dimensions c(a*b,a*b). Neither a nor b is known in advance. I want the "n-th" a*a submatrix of y to be x[,,n] (where 1 <= n <= b^2). Needless to say, this has gotta be vectorized! Toy example with a=2, b=3 follows: Given: x <- array(1:36,c(2,2,9)) I require: y <- matrix(as.integer(c( 1, 2, 5, 6, 9,10, 3, 4, 7, 8,11,12, 13,14,17,18,21,22, 15,16,19,20,23,24, 25,26,29,30,33,34, 27,28,31,32,35,36 )),6,6) So identical(x[,,1] , y[1:2,1:2]) identical(x[,,2] , y[3:4...
2009 Sep 19
3
Creating histograms from factors using a for loop
# I have a dataframe with data and factors similar to the following: a <- rep(c("a", "b"), c(6,6)) df <- data.frame(f=a, d=rnorm(12)) df # I am trying to write a 'for' loop which will produce a jpeg histogram for each factor. I can individually isolate the data from a factor and produce a jpeg histogram like so: fnc <- function(x){ x <- df[df$f=="a", &...
2009 Sep 19
2
Counting observations of a combined factor
#I have a dataset with two factor. I want to combine those factors into a single factor and count the number of data values for each new factor. The following gives a comparable dataframe: a <- rep(c("a", "b"), c(6,6)) b <- rep(c("c", "d"), c(6,6)) df <- data.frame(f1=a, f2=b, d=rnorm(12)) df # I use the 'interaction' function to combine factors f1 and f2: df2 <- data.frame(f3=interaction(df[,"f1"], df[,"f2"]), d=df[,"d"]) df2 # A count of...
2013 Feb 19
1
data format
...lyr) elsplit3<-lapply(elsplit2,function(x) join(datetrial,x,by="date1",type="full")) ?elsplit4<-lapply(elsplit3,function(x) {x[,2][is.na(x[,2])]<- "-9999.000";x}) elsplit5<-lapply(elsplit4,function(x) {x[,1]<-format(x[,1],"%Y.%m.%d");x}) elsplit6<-lapply(elsplit5,function(x){substr(x[,1],6,6)<-ifelse(substr(x[,1],6,6)==0," ",substr(x[,1],6,6));substr(x[,1],9,9)<- ifelse(substr(x[,1],9,9)==0," ",substr(x[,1],9,9));x}) ?elsplit6[[1]][1:4,] #?????? date1 discharge #1 1930. 1. 1 -9999.000 #2 1930. 1. 2 -9999.000 #3...
2008 Feb 14
3
Transposing by a group variable
Hi R, Can I transpose a data frame by a particular group variable? For example: d=data.frame(group=c(1,1,2,2,2),val=c(6,4,6,3,5)) And my output should be: data.frame(group=c(1,2),v1=c(6,6),v2=c(4,3),v3=c(NA,5)) Many thanks, Shubha This e-mail may contain confidential and/or privileged i...{{dropped:13}}
2007 Apr 22
0
3 commits - configure.ac libswfdec/swfdec_debug.h swfdec-gtk.pc.in swfdec.pc.in
configure.ac | 12 ++++++------ libswfdec/swfdec_debug.h | 2 +- swfdec-gtk.pc.in | 2 +- swfdec.pc.in | 2 +- 4 files changed, 9 insertions(+), 9 deletions(-) New commits: diff-tree 086e5f3c4da50df4b485792da7ca49a25484aebc (from ca4b02b5852291d4bf3d11e71278229530d6e973) Author: Benjamin Otte <otte@gnome.org> Date: Sun Apr 22 12:45:03 2007 +0200 we require at least glib 2.4 for some queue functions There's probably an even higher version required, but I...
2012 Jan 08
2
need help with axis ticks
hi, i am using par(mrow=c(6,6)) function to get 6x6 plots on one screen. the problem that i am having is that the axis tick labels are far away from the ticks and going into previous plots (see attached figure). i need to know how can i reduce the distance between the ticks and their values (y axis values).the part of the cod...
2005 Jun 22
1
How to use expression in label with xYplot
...=seq(nom)) if I use this function to create the labels : lab <- function(i) as.expression(bquote(italic(phantom(0)^{.(num[i])}*.(nom[i])))) label(df$GE78) <- lab(1) label(df$CS137) <- lab(2) label(df$TE129m) <- lab(3) all works fine when I use text and xyplot : plot(1:10) text(6,6,labels=label(df$CS137)) xyplot(CS137~TE129m,data=df,xlab=label(df$CS137),ylab=label(df$TE129m)) but xYplot doesn't work fine xYplot(CS137~TE129m,data=df) I have the message : Error in parse(file, n, text, prompt) : parse error if I change the lab function lab <- function(i) as.char...
2011 Sep 30
2
Overlapping plot in lattice
Hi all, I was wondering if there's an equivalent to par(new=T) of the plot function in lattice. I'm plotting an xyplot, and I would like to highlight one point by plotting that one point again using a different symbol. For example, where 6 is highlighted: plot(1:10, xlim=c(0,10), ylim=c(0,10)) par(new=T) plot(6,6, xlim=c(0,10), ylim=c(0,10), pch=16) Is there a way to do this in lattice? Thanks, Kang Min
2005 Feb 21
4
49 histograms on one page
Hi, I want to do something like this: par(mfrow=c(7,7)) for (i in 1:49) hist(RATDACOM[SUBJNO==i],breaks=0.5+(0:6), main="",xlab="",ylab="",xaxt="n",yaxt="n") (Don't think about what RATDACOM and SUBJNO are.) I get an error Error in plot.new() : Figure margins too large. 36 histograms with mfrow=c(6,6) work. But the 36 histograms are then so smal...
2020 Apr 02
2
[PATCH] vhost: drop vring dependency on iotlb
...Signed-off-by: Michael S. Tsirkin <mst at redhat.com> --- This is on top of my previous patch (in vhost tree now). drivers/vdpa/Kconfig | 1 + drivers/vhost/Kconfig | 1 - 2 files changed, 1 insertion(+), 1 deletion(-) diff --git a/drivers/vdpa/Kconfig b/drivers/vdpa/Kconfig index 7db1460104b7..08b615f2da39 100644 --- a/drivers/vdpa/Kconfig +++ b/drivers/vdpa/Kconfig @@ -17,6 +17,7 @@ config VDPA_SIM depends on RUNTIME_TESTING_MENU select VDPA select VHOST_RING + select VHOST_IOTLB default n help vDPA networking device simulator which loop TX traffic back diff --git a...
2020 Apr 02
2
[PATCH] vhost: drop vring dependency on iotlb
...Signed-off-by: Michael S. Tsirkin <mst at redhat.com> --- This is on top of my previous patch (in vhost tree now). drivers/vdpa/Kconfig | 1 + drivers/vhost/Kconfig | 1 - 2 files changed, 1 insertion(+), 1 deletion(-) diff --git a/drivers/vdpa/Kconfig b/drivers/vdpa/Kconfig index 7db1460104b7..08b615f2da39 100644 --- a/drivers/vdpa/Kconfig +++ b/drivers/vdpa/Kconfig @@ -17,6 +17,7 @@ config VDPA_SIM depends on RUNTIME_TESTING_MENU select VDPA select VHOST_RING + select VHOST_IOTLB default n help vDPA networking device simulator which loop TX traffic back diff --git a...
2008 Jun 09
3
Overlaying the matrices
Hi R, I have a matrix, > x1=matrix(NA,6,6,dimnames=list(letters[1:6],LETTERS[1:6])) > x1 A B C D E F a NA NA NA NA NA NA b NA NA NA NA NA NA c NA NA NA NA NA NA d NA NA NA NA NA NA e NA NA NA NA NA NA f NA NA NA NA NA NA > x2=matrix(rpois(9,1),3,3,dimnames=list(c("b","a","f"),c(&quo...
2009 Feb 09
2
Help on BarPlot
...all As a new user of R, can someone please help me with the following I have created a programme to analyse laboratory data and one of the graphs is a bar plot of 'Z' scores. On the bar plot I am using the following line to plot some results barplot (zb[,c("ZBW")], ylim = c(-6,6), names.arg=zb[,c("LabNo")],xlab="Lab Code Number", cex.names = .5 , axis.lty=1 , main = " Total Coliform ") What I would like to do is move the xlab parameter to sit on top or on each bar and not on the x-axis at y=0. Any help would be appreciated. Thanks Steve...
2005 Apr 05
3
How to do aggregate operations with non-scalar functions
Hi, I have a data set, the structure of which is something like this: > a <- rep(c("a", "b"), c(6,6)) > x <- rep(c("x", "y", "z"), c(4,4,4)) > df <- data.frame(a=a, x=x, r=rnorm(12)) The true data set has >1 million rows. The factors "a" and "x" have about 70 levels each; combined together they subset 'df' into ~900 data...
2002 Aug 28
2
sourcing a file with the plot.lme() function
...the following code in a file "plot.R" : library(nlme) data(Loblolly) fm1 <- nlme(height ~ SSasymp(age, Asym, R0, lrc), data = Loblolly, fixed = Asym + R0 + lrc ~ 1, random = Asym ~ 1, start = c(Asym = 103, R0 = -8.5, lrc = -3.3)) windows(6,6) plot(fm1) This code is taken from the help page for 'nlme'. If I cut an paste this code into the console, everything works as expected. However, if I try to execute the code by calling source("plot.R") the plot is never made. Has anyone seen this? > version _...
2017 Nov 17
2
[PATCH 03/13] x86/paravirt: Convert native patch assembly code strings to macros
On Wed, Oct 04, 2017 at 10:58:24AM -0500, Josh Poimboeuf wrote: > Convert the hard-coded native patch assembly code strings to macros to > facilitate sharing common code between 32-bit and 64-bit. > > These macros will also be used by a future patch which requires the GCC > extended asm syntax of two '%' characters instead of one when specifying > a register name. > > Signed-off-by: Josh Poimboeuf <jpoimboe at redhat.com> > --- > arch/x86/includ...
2017 Nov 17
2
[PATCH 03/13] x86/paravirt: Convert native patch assembly code strings to macros
On Wed, Oct 04, 2017 at 10:58:24AM -0500, Josh Poimboeuf wrote: > Convert the hard-coded native patch assembly code strings to macros to > facilitate sharing common code between 32-bit and 64-bit. > > These macros will also be used by a future patch which requires the GCC > extended asm syntax of two '%' characters instead of one when specifying > a register name. > > Signed-off-by: Josh Poimboeuf <jpoimboe at redhat.com> > --- > arch/x86/includ...