search for: matpoint

Displaying 20 results from an estimated 21 matches for "matpoint".

Did you mean: mntpoint
2000 Mar 26
1
matlines, matpoints don't follow prototype (PR#506)
The Blue Book allows the 'type' argument to be used in matpoints and matlines. matlines(x, y, type="l", lty=1:5, pch=, col=1:4) R-1.0.0 does not. Thus, type="h", "b", must be invoked thru matplot( x, y, type = "h", add=TRUE) For the sake of consistency with S, it would be nice to have matlines defined as: "matl...
1999 Nov 24
1
cex in matpoints
R graphics: points ( .., pch= , cex= ) adjusts size, but matpoints ( .., pch= , cex= ) does not. Feature? Bug? thanks -.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.- r-help mailing list -- Read http://www.ci.tuwien.ac.at/~hornik/R/R-FAQ.html Send "info", "help", or "[un]subscribe" (in the "body&...
2009 Sep 11
2
help with for loop
...ayxx<meandayyy x_index[i] = which(diff[i]>0) x[i] = raw_urine[x_index[i],1] dayx[i]= raw_urine[x_index[i],day1_ind] dayy[i] = raw_urine[x_index[i],columns] jpeg("test 1.jpg",width=800, height = 800) matplot(x[i],dayx[i],lwd = 3,pch=1,col = "black",xlim=xbound, ylim=ybound) matpoints(x[i],dayy[i],lwd=3,pch=1,col="red") dev.off() return(length(y),length(x_index),diffbig)} else{ xx_index[i] = which(diff[i]<0, arr.ind=TRUE) xx[i] = raw_urine[xx_index[i],1] dayxx[i] = raw_urine[xx_index[i],day1_ind] dayyy[i] = raw_urine[xx_index[i],columns] jpeg("test 2.jpg"...
2009 Sep 11
1
help with plotting
....09.sample.stability.analysis\\urine\\all.urine.features.t.test.result", header = TRUE ) library(compositions) p = function(a,b){ y = pvalue[,a] if(y<0.01){ index = which(y, arr.ind=TRUE) day1 = raw_urine[index,3:7] day2 = raw_urine[index,b] graph = {matplot(raw_urine[index,1],day1,lwd = 3) matpoints(raw_urine[index,1],day2,lwd = 3, col="red")} print(graph) }} the above is my sample code in which i'm trying to output some graphs. but however, I can get return() to return value I want and all. But I just don't know if there's anything special I need to use to output graph...
2010 Apr 17
1
Fishy error with NAMESPACE when checking package
I am updating the Epi package. I added functions named pc.points and pc.matpoints. Erroneously I wrote pc.plot and pc.matplot in the NAMESPACE file and of course got an error from Rcmd check. So I corrected the NAMESPACE file, but I still get from r-check: * install options are ' --no-html' Loading required package: utils Error in namespaceExport(ns, exports) : unde...
1998 Jan 16
0
matplot
...x, etc., exactly like the other options (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...
2020 Jan 28
0
matplot.Date & matplot.POSIXct
...CRAN includes a "matplot" help page with examples > that worked when I tested them recently. Indeed. That's how I understood you well. matplot() has been one of my favorite plotting functions in S and Splus in the 1990s ... and that's why the R source code of matplot(), matpoints(), and matlines() still has a comment mentioning that I wrote (the first version of) it for R on June 27, 1997. By design (from S), matplot() {etc} has always been thought as a convenience wrapper to calling plot() and lines(), lines(), lines() or plot() and points(), points(), points()...
2020 Jan 28
1
matplot.Date & matplot.POSIXct
...s.numeric(x) behavior? > If we'd change this in R's graphics, it will be > - me and/or the CRAN team who have to contact CRAN package > maintainer about problems > (maybe none, as the change may not break any checks) > > - Users of matplot() {& matlines() & matpoints()} who may have to > adopt their calls to these functions {I'm pretty sure all > three would have to change for consistency}. > > ----- and then, there are quite a few other changes, bug > assignments to which I have committed which should be > dealt wit...
2020 Jan 28
4
matplot.Date & matplot.POSIXct
????? Thanks for the reply. On 2020-01-27 19:56, Abby Spurdle wrote: > Maybe I'm missing something really obvious here, but I was unable to > create a matrix out of POSIXct object(s). > Perhaps that deserves a separate discussion...? ????? Can you provide an example? ????? The standard matplot application that concerns me is with matplot(x, y, ...) where x has class Date or
2004 Sep 17
0
Ploting Mean and SE on regression lines
...terval="confidence") plot.new() plot.window(xlim=range(temp),ylim = range(pred.w.plim[,-1])) axis(1,at=seq(16,32,by=4),tck=.03,font.axis=6,labels=FALSE) axis(2,at=seq(5,40,by=8),tck=.03,las=1,font.axis=6) title (ylab="Development time (Days)",cex.lab=1.5,font.lab=6) matpoints(new$temp,cbind(pred.w.clim, pred.w.plim[,-1]), lty=c(1,3,3,4,4), type="l", col = "black", lwd = 1.5) points(temp, pch="o", dev1hr) mtext("A:1 h",line=-3,cex=.8,font=6,adj=.9) box(bty="L") ____________________ Sivakumar Mohandass, Depart...
2006 Jun 07
2
multiple data sets on one plot
Hello, I am learning how to use R, and I cannot figure out how to plot more than one data set on a single plot. Can you help me out? Cheers, Mark -- Mark Sessing CIMMS Research Fellow Meteorologist NWS Warning Decision Training Branch 3200 Marshall Ave Ste. 202 Norman, OK 73072 Phone: 405-573-3332 Fax: 405-573-3462 Mark.L.Sessing at noaa.gov
2010 Mar 29
1
getting CI's for certain y of nls fitted curve
...),"gradient"),1, function(x) sum(vcov(mod1)*outer(x,x)))) ###plot points and curve with ci's matplot(press_x, predict(mod1, data.frame(press = press_x))+outer(se.fit,qnorm(c(.5, .025,.975))), type="l",lty=c(1,3,3),ylab="transp",xlab="waterpot") with(por, matpoints(press,tr,pch=1)) ###the desired y is the tenth of the y asymptote asym<-coef(mod1)[1] tenth<-asym*0.1 abline(h=asym) abline(h=tenth,lty=5) text(10,65,"10% of max. transpiration",adj=0) ###finding corresponding x by y with inverse function: Asym=coef(mod1)[1] xmid=coef(mod1)[2]...
2003 Dec 09
1
arni.colors
..., plt=c(0.15,0.9,0.2,0.95)) plot(NA, xlim=c(-0.01,1.01), ylim=c(-0.01,1.01), xlab="Spectrum", ylab="", xaxs="i", yaxs="i", axes=FALSE) title(ylab="Value", mgp=c(3.5,0,0)) matlines(x, rgb.m, col=colnames(rgb.m), lty=1, lwd=3) matpoints(x, rgb.m, col=colnames(rgb.m), pch=16) axis(1, at=0:1) axis(2, at=0:1, las=1) par(fig=c(0,1,0.75,0.9), plt=c(0.08,0.97,0,1), new=TRUE) midpoints <- barplot(rep(1,n), col=hsv.v, border=FALSE, space=FALSE, axes=FALSE) axis(1, at=midpoints, labels=1:n,...
2005 Jul 07
2
Brewer colours
...0,1,0,0.7), plt=c(0.15,0.9,0.2,0.95)) plot(NA, xlim=c(-0.01,1.01), ylim=c(-0.01,1.01), xlab="Spectrum", ylab="", xaxs="i", yaxs="i", axes=FALSE) title(ylab="Value", mgp=c(3.5,0,0)) matlines(x, rgb.m, col=colnames(rgb.m), lty=1, lwd=3) matpoints(x, rgb.m, col=colnames(rgb.m), pch=16) axis(1, at=0:1) axis(2, at=0:1, las=1) par(fig=c(0,1,0.75,0.9), plt=c(0.08,0.97,0,1), new=TRUE) midpoints <- barplot(rep(1,n), col=hsv.v, border=FALSE, space=FALSE, axes=FALSE) axis(1, at=midpoints, labels=1:n, lty=0, cex.a...
2007 Mar 07
2
Multi-line plots with matrices in R
Hello all, I'm a new user of R, experienced with Octave/MATLAB and therefore struggling a bit with the new syntax. One of the easy things in Octave or MATLAB is to plot multiple lines or sets of points by using a matrix where either the columns or the rows contain the y-values to be plotted. Both packages automatically give each line/points their own unique colour, character etc. I'm
2009 Jun 26
0
R 2.9.1 is released
...9eebdf0cec3fd2c489fc94d99b00 R-latest.tar.gz Here is the relevant part of the NEWS file: CHANGES IN R VERSION 2.9.1 NEW FEATURES o New function anyDuplicated(x) returns 0 (= FALSE) or the index of the first duplicated entry of x. o matplot(), matlines() and matpoints() now also obey a 'lend' argument, determining line end styles. (Wish of PR#13619). o bw.SJ(), bw.bcv() and bw.ucv() now gain an optional 'tol' argument allowing more accurate estimates. o new.packages() no longer regards packages with the same name...
2009 Jun 26
0
R 2.9.1 is released
...9eebdf0cec3fd2c489fc94d99b00 R-latest.tar.gz Here is the relevant part of the NEWS file: CHANGES IN R VERSION 2.9.1 NEW FEATURES o New function anyDuplicated(x) returns 0 (= FALSE) or the index of the first duplicated entry of x. o matplot(), matlines() and matpoints() now also obey a 'lend' argument, determining line end styles. (Wish of PR#13619). o bw.SJ(), bw.bcv() and bw.ucv() now gain an optional 'tol' argument allowing more accurate estimates. o new.packages() no longer regards packages with the same name...
1997 Jul 22
7
R-alpha: New version of R for testing
...perimental function called "delay" which creates a promise to evaluate an expression. This provides direct access to the lazy evaluation mechanism used by R. o >>>> 'make tests' allows to test--run all the help() examples. o New functions matplot / matpoints / matlines. o cut has 2 new arguments. 'right = TRUE' gives intervals closed on the right, open to the left (as S); 'right = FALSE' allows to reverse this. The code for default label construction has been enhanced, and can be controlled by the new argument 'dig.lab'....
2020 Apr 24
0
R 4.0.0 is released
..., rpois(), rnbinom(), rsignrank() and rwilcox() which have returned integer since R 3.0.0 and hence NA when the numbers would have been outside the integer range, now return double vectors (without NAs, typically) in these cases. * matplot(x,y) (and hence matlines() and matpoints()) now call the corresponding methods of plot() and lines(), e.g, when x is a "Date" or "POSIXct" object; prompted by Spencer Graves' suggestion. * stopifnot() now allows customizing error messages via argument names, thanks to a patch proposal...
2020 Apr 24
0
R 4.0.0 is released
..., rpois(), rnbinom(), rsignrank() and rwilcox() which have returned integer since R 3.0.0 and hence NA when the numbers would have been outside the integer range, now return double vectors (without NAs, typically) in these cases. * matplot(x,y) (and hence matlines() and matpoints()) now call the corresponding methods of plot() and lines(), e.g, when x is a "Date" or "POSIXct" object; prompted by Spencer Graves' suggestion. * stopifnot() now allows customizing error messages via argument names, thanks to a patch proposal...