search for: pch

Displaying 20 results from an estimated 2640 matches for "pch".

Did you mean: pc
1998 Jan 16
0
matplot
...(col, lty ...) -- (these diffs are long, skip down two pages if you want to see the other way) *** matplot.orig Tue Jan 13 18:17:54 1998 --- matplot.new2 Tue Jan 13 18:16:49 1998 *************** *** 1,12 **** ###---- As S (just 'better' ...) ! matpoints <- function(x, y, lty=1:5, pch=NULL, col=1:6, ...) matplot(x=x, y=y, type = 'p', lty=lty, pch=pch, col=col, add=TRUE, ...) ! matlines <- function(x, y, lty=1:5, pch=NULL, col=1:6, ...) matplot(x=x, y=y, type = 'l', lty=lty, pch=pch, col=col, add=TRUE, ...) matplot <- function(x, y, type="p&...
2001 Jul 25
2
pch with plot and legend
I'm trying to plot a scatterplot of two variables using pch to plot different characters based on a third factor. Here is my example > data("ToothGrowth") > attach(ToothGrowth) > levels(supp) [1] "OJ" "VC" > plot(len ~ dose,pch=as.numeric(supp)) > legend(locator(1),pch=as.numeric(supp),legend=levels(supp)) The...
2004 May 12
4
points(*, pch=NA) does *not* not draw the point (PR#6876)
We say in ?points that 'pch' (among others) can be set to NA for omitting a point. While this works in cases where there's at least one point left to draw, it fails in a simple case like this : > plot(1, pch = NA) Error in plot.xy(xy.coords(x, y), type = type, pch = pch, col = col, bg = bg, : invalid plotting...
2012 Jul 18
1
ggplot2 qplot pch not working anymore
Is there a way to use a continuous variable to pch in qplot? I believe this worked in previous version. I need to specify certain values of a shape for particular points so that multiple graphs all show the same shapes for the same streams. I have gone to the original data and added a pch column that I would like to use to specify the shapes...
2011 Nov 18
3
tip: large plots
Hi all, I'm working with a bunch of large graphs, and stumbled across something useful. Probably many of you know this, but I didn't and so others might benefit. Using pch="." speeds up plotting considerably over using symbols. > x <- runif(1000000) > y <- runif(1000000) > system.time(plot(x, y, pch=".")) user system elapsed 1.042 0.030 1.077 > system.time(plot(x, y)) user system elapsed 37.865 0.033 38.122 If...
2001 Jan 15
0
legend() patch never seems to have made it in
...this patch is against, but I don't think legend() has changed since then ...) Basically, the problem is that if you want to have "opaque" points that overlay lines (rather than using type="b" and having the lines leave a little bit of space around the points), you can use pch=21,bg=par("bg"), but this is hard to replicate in legend(). For example: x <- 1:10 y <- runif(10) plot(x,y,type="l",ylim=c(0,1.2)) points(x,y,pch=21,bg="white") legend(6,1.2,"foo",pch=21,pt.bg="white",lty=1) Here's the patch, which...
2011 Dec 15
2
[LLVMdev] llvm/clang test failures on powerpc-darwin8
...Clang : : CodeGenObjC/debug-info-crash-2.m Clang : : Index/c-index-api-loadTU-test.m Clang : : Index/nested-binaryoperators.cpp Clang : : Index/recursive-member-access.c Clang : : Index/redeclarations.cpp Clang : : Modules/decldef.mm Clang : : Modules/diamond-pch.c Clang : : Modules/diamond.c Clang : : Modules/lookup.cpp Clang : : Modules/module-private.cpp Clang : : Modules/objc-categories.m Clang : : Modules/on-demand-build.m Clang : : Modules/submodules.cpp Clang : : Modules/wildcard-submodule-exports.cpp Cl...
1998 Apr 16
2
Problem with visual C++ and samba
We are having a problem with Microsoft visual C++ compiling source code maintained on a samba server. Occasionaly the compiler reports that it cant open the file vc50.pch. The samba server is running on a freebsd box. Taking a look at the log files it looks like when the operation fails the server is processing the command open (vc50.pch for exclusive use write setattrE write open (vc50.pch and this not unreasonably fails on a succesfull compilation the c...
2012 Jul 27
0
[PATCH 3/3] nouveau: add vblank methods on newer cards
...display_vblank_crtc_handler(struct drm_device *dev, int crtc) { struct drm_nouveau_private *dev_priv = dev->dev_private; @@ -655,18 +655,29 @@ nv50_display_vblank_crtc_handler(struct drm_device *dev, int crtc) continue; spin_lock(&psw->peephole_lock); - nv_wr32(dev, 0x001704, pch->vblank.channel); - nv_wr32(dev, 0x001710, 0x80000000 | pch->vblank.ctxdma); - if (dev_priv->chipset == 0x50) { - nv_wr32(dev, 0x001570, pch->vblank.offset); - nv_wr32(dev, 0x001574, pch->vblank.value); + if (dev_priv->chipset < 0xc0) { + nv_wr32(dev, 0x001704, pch-&gt...
2011 Mar 16
3
[LLVMdev] [release_29] Good status of ppc-redhat-linux on Fedora 12 PS3
...field-promote.c Clang :: CodeGenCXX/debug-info-byval.cpp Clang :: CodeGenCXX/debug-info-namespace.cpp Clang :: CodeGenCXX/vtable-debug-info.cpp Clang :: Driver/hello.c Clang :: Index/c-index-api-loadTU-test.m Clang :: Index/c-index-getCursor-test.m Clang :: Index/c-index-pch.c Clang :: PCH/chain-cxx.cpp Clang :: PCH/chain-remap-types.m Clang :: PCH/chain-selectors.m Clang :: PCH/check-deserializations.cpp Clang :: PCH/cuda-kernel-call.cu Clang :: PCH/cxx-friends.cpp Clang :: PCH/cxx-namespaces.cpp Clang :: PCH/cxx-static_assert.cpp C...
2009 Nov 30
1
Plotting color.legend() outside of plot region
...ure region. I would like it more to the right in the device region. Thank, Tim library(TeachingDemos) op <- par(mfrow = c(3,3), ## split region oma = c(0,0,4,12) + 0.1, ## create outer margin mar = c(5,4,2,2) + 0.1) ## shrink some margins plot(1:10, main = "a", pch = 1:2, col= 1:2) plot(1:10, main = "b", pch = 1:2, col= 1:2) tmp1 <- cnvrt.coords( 0.5, 0, input='plt' )$tdev # save location for mtext plot(1:10, main = "c", pch = 1:2, col= 1:2) plot(1:10, main = "d", pch = 1:2, col= 1:2) plot(1:10, main = "e", p...
2006 Jun 29
1
inconsistent matplot behaviour?
I raised this question quite some time ago but it quitly went down the river. I'll give it a second try (before keeping my modified version of matplot for ever...): matplot supports vectors (and/or character strings) for a number of arguments namely `type', `lty', `lwd', `pch', `col', `cex'. all of them act consistently in such a way that the first entries are used for plot of x-column 1 vs. y-column 1 and so forth. for some reason `bg' is missing from this list (maybe simplyh forgotten?). this causes an, according to my mind, at least, undesirable (...
2011 Sep 01
1
Background fill and border for a legend in dotplot
...;,"yellow") sym.pat<-c(19,20,21) ##set up the plot key #---------------------------------------------------------------------------------------- key1 <- draw.key(list(text=list(levels(Cal_dat$Commodity)), title="Ore type", points=list(pch=22, cex=1.3, fill=col.pat, col="black")), draw = FALSE) key2 <- draw.key(list(text=list(levels(factor(Cal_dat$Year))), title="Year", points = list(pch = c(21, 22, 23), cex=1.3, col="black")), draw = FALSE)...
2000 Oct 19
0
legend -- one more try
...seg.len user-settable, I don't know if it's worth the bother). This time the patch is against the current legend() in R-devel. *** new-legend.R Thu Oct 19 16:25:36 2000 --- R-devel/src/library/base/R/legend.R Wed Sep 6 04:11:16 2000 *************** *** 141,171 **** } if(has.pch || do.lines) col <- rep(col,length.out=n.leg) - - if (do.lines) { #- draw lines --------------------- - seg.len <- 2 # length of drawn segment, in xchar units - ok.l <- if(missing(lty)) { lty <- 1; TRUE } else lty > 0 - if(missing(lwd)...
2005 Mar 22
1
pch=NA (PR#7737)
I'd like to suggest changes to three help pages, regarding the use of pch=NA to suppress plotting symbols. See below. Arni R 2.0.1 on WinXP === help(bxp) === The argument outpch=" " needs to be replaced with outpch=NA in two places. I actually wrote this part of the documentation myself at one point, but have now realized that pch=NA and pch=" &quo...
2010 May 25
1
Lattice: relation = 'free' in scales
...scen2 = 1:nscen2, gen = gens, rep = 1:3) tab$value <- rnorm(nrow(tab),mean = with(tab,method*1000 + scen1*10 + scen2*10 + gen*100),sd = 100) tab$color <- factor(tab$scen2) levels(tab$color) <- rainbow(length(levels(tab$color))) tab$pch <- tab$color levels(tab$pch) <- seq(21,21 + length(levels(tab$pch))) tab$pch <- as.numeric(as.character(tab$pch)) tab$color <- as.character(tab$color) ylim <- with(tab,tapply(value,method,range)) ylim <- ylim[rep(seq(1,length(ylim)),each = length(unique(tab$scen1)))] tab$method...
2011 Jun 07
2
Line Graphs
...s what I have so far: # Calculate range from 0 to max value of cars and trucks g_range <- range(0, 1) # Graph autos using y axis that ranges from 0 to max # value in cars or trucks vector. Turn off axes and # annotations (axis labels) so we can specify them ourself plot(B, type="o", pch = 0, lty=1,col="blue", ylim=g_range, axes=FALSE, ann=FALSE) # Make x axis using the values of pi_0 labels # axis(1, at=1:10, lab=c("0.1","0.2","0.3","0.4","0.5","0.6","0.7","0.8","0.9","1.0&quo...
2006 Nov 09
1
plot pch
Dear All, I have a data as follows: ID <- 1:100 Y <- rnorm(100) X <- rnorm(100) type <- as.factor(rep(1:3,100,time=1)) df <- as.data.frame(cbind(ID, Y,X,type)) I want to plot Y versus X by specifying the pch to be as follows: Subjects having type = 1 must be plotted with a character pch = "A" Subjects having type = 2 must be plotted with a pch = "B" Subjects having type = 3 must be plotted with a pch = 21 I used the follwomg: df$pch_type = recode(df$type, &q...
2012 Aug 26
4
error type
...lim, ylim, type = "n", ann = FALSE, axes = FALSE, : argumento formal "type" corresponde a mĂșltiplos argumentos especificados DATA: 44 40 39 38 0 7 7 1030 57 37 5146 40 41 4737 34 36 2636 28 33 3738 26 28 2742 38 36 3636 27 22 2853 43 33 40 plot(dados[1],type="o",pch=21, axes=FALSE,xlab="year",ylab="cases")lines(dados[2], type="o", pch=22)lines(dados[3], type="o",pch=23)lines(dados[4], type="o",pch=24)legend(1,8.5, legend=c("Pel","RG","SM","SV"),pch=21:24)axis(1,at=1:10, l...
2008 Jan 23
3
How do I get a character and a symbol in a legend
In the following snippet plot(1:10,1:10,type="n") points(1:5,1:5,pch="+") points(6:10,6:10,pch=20) legend(5,5, c("A","B"), pch=c("+",20)) I want to get a legend with a "+" and a solid circle (pch=20). However, what I get in the legend is "+" and "2". How can I get a "+" and a solid cir...