search for: ylimit

Displaying 16 results from an estimated 16 matches for "ylimit".

Did you mean: limit
2009 Sep 14
1
How do I ensure that the minimum value is always displayed on a y-axis in a plot?
...0.97048682 0.95669389 1.07568609 1.02615707 1.21670864 [289] 1.26424976 1.03758636 1.00911849 0.88467871 0.90480334 0.91616568 [295] 0.81912570 0.80111286 0.47223969 0.64554445 0.64264599 0.60489611 [301] 0.56542526 0.49117982 0.45614010 0.46773733 0.40172436 0.40196829 [307] 0.43754909 0.36359256 ylimits<-range(c(blah,1.3)) plot(blah,type="l",yaxt="n",ann=FALSE,ylim=ylimits) b<-ylimits[1] e<-ylimits[2] tickMarks<-round(tickMarks<-seq(b,e,by=(e-b)/6),2) axis(2,las=2,at=tickMarks,labels=sprintf("%.2f",tickMarks));
2006 Sep 11
1
graphics: y limit on xyplot
I would like to set the y axis limit of an xyplot using the object 'ylimit', but receive this error: [1] 990 Error in extend.limits(limitlist[[i]], axs = axs) : improper length of lim I get the same error if I use ylim. library(lattice) trellis.device(col = FALSE, theme = lattice.getOption("col.whitebg")) name <- "Variable name" symbols &lt...
2009 Mar 02
1
handle graph size in eps
Hi all, I've got a density graph made with the following commands: win.graph(width=13,height=6) par ( fin=c(13,3) ,mai=c(1,1,0.5,0.5) ,mfrow=c(1,2) ,cex.axis=1.5 ,cex.lab=1.5) dens<-density(DATA1.y[2,]-mean(DATA1.y[2,]),kernel="gaussian") xlimit<-range(dens$x) ylimit<-range(dens$y) hist( DATA1.y[2,]-mean(DATA1.y[2,]) ,xlim=1.1*xlimit ,xlab=expression(q[e]) ,ylim=1.1*ylimit ,probability=T ,main="Random distribution around y") lines(dens,col=2,) rm(dens,xlimit,ylimit) qqnorm(DATA1.x[1,]) that's what I've on the screen and I'm OK...
2009 Aug 19
3
Hello
Hello!   I am trying to merge two xy-plot with different ylimits.   Can someone please give me possible way of achieving it..   Thank you Regards Dimple [[alternative HTML version deleted]]
2011 Mar 01
1
Lattice: useOuterStrips and axes
Consider the following: library(lattice) library(latticeExtra) temp <- expand.grid( subject = factor(paste('Subject', 1:3)), var = factor(paste('Variable', 1:3)), time = 1:10 ) temp$resp <- rnorm(nrow(temp), 10 * as.numeric(temp$var), 1) ylimits <- by(temp$resp, temp$var, function(x) range(pretty(x))) useOuterStrips(xyplot( resp ~ time | subject * var, data = temp, as.table = TRUE, scales = list( alternating = 1, tck = c(1, 0), y = list(relation = 'free', rot = 0, limits = rep(yl...
2011 May 23
1
panel.first problem when plotting with formula
...don't know how to fix it. Someone have a straightforward silver bullet? Thank you, Gene bgfun = function(color='honeydew2',linecolor='grey45', addgridlines=TRUE){ tmp=par("usr") rect(tmp[1], tmp[3], tmp[2], tmp[4], col=color) if(addgridlines){ ylimits=par()$usr[c(3,4)] abline(h=pretty(ylimits,10), lty=2, col=linecolor) } } dat = data.frame(x=1:10,y=1:10) ## Works plot(dat$x, dat$y, panel.first=bgfun()) ## Why doesn't this work? plot(y ~ x, data=dat, panel.first=bgfun()) [[alternative HTML version deleted]]
2013 Oct 14
0
ENMCA in EnQuireR problems!
...n as it gets Device 3 with the following error msg: > b.res<-ENMCA(b[,1:5]) Erro em if (del == 0 && to == 0) return(to) : absent value where TRUE/FALSE is need Al?m disso: There were 50 or more warnings (use warnings() to see the first 50) OR SOMETHINGS: Erro em seq.default(-ylimit, ylimit, 0.01 * ylimit) : 'from' cannot be NA, NaN or infinite Al?m disso: There were 50 or more warnings (use warnings() to see the first 50) For your information, data has some missing values. I have the R x64 3.0.2. I use Windows 64bits. I do appreciate any suggestion. Regard...
2009 Sep 16
1
Can someone please explain why the last tick mark on this chart is not showing?
...e<-pretty(c(sample,pxTarget)) dataMin<-min(sample,na.rm=T)*0.95 dataMax<-max(purtee) # Step 3: Create exponential series t<-exp(seq(log(dataMin),log(dataMax),length=11)) t2<-round(t,-1) t2[t2==0]<-1 # natural looking labels lab<-signif(round(t,-1),2) lab[1]<-signif(lab[1],1) ylimits<-range(log(t2,10)) plot(sampleLog,type='l',xaxt="n",yaxt="n",ylim=ylimits,las=2,ann=FALSE) axis(2,las=2,at=log(lab,10),labels=lab);
2007 Nov 23
1
ggplo2: fixed extent greater than data?
...tly: I'd like to produce a series of maps with different data on, but exactly the same extent in each plot. Is there a way of switching the automatic extent (to the data of the last layer added) OFF? I'm trying something like: drawOverviewMap<-function(){ p2<-ggplot(xlimits=c(2,20),ylimits=c(43,50))+coord_map(project="azequalarea") p2<-p2+geom_path(data=wa,mapping=aes(x=x,y=y)) p2<-p2+geom_point(data=spts,mapping=aes(x=Lon,y=Lat)) return(p2) } If I plot this in cartesian coordinates, it will zoom to the extent of the country boundaries "wa", plus some e...
2000 Nov 20
1
Bug in stars.R (PR#739)
...(808) 739-1367 or 387-9352. Work: International Archaeological Research Institute, Inc., 2081 Young St., Honolulu, Hawaii 96826. Voice (808) 946-2548; Fax 943-0716. function (x, full = TRUE, scale = TRUE, radius = TRUE, labels = dimnames(x)[[1]], locations = NULL, xlimit = NULL, ylimit = NULL, len = 1, colors = NULL, key.loc = NULL, key.labels = NULL, draw.segments = FALSE, draw.axes = FALSE, ...) { if (is.data.frame(x)) x <- as.matrix(x) else if (!is.matrix(x)) stop("x must be a matrix or a data frame") if (!is.numeric(x))...
2003 Sep 17
0
Just don't do it, surely? (was RE: Retrieve ... argument values)
...butor to the R project (and that's an understatement, I know), you do have to worry about this - users of your routines may like to use partial matching. But I hope most of us don't. Worse news is that my posted formulation would suffer the same problem if I had an explicit argument "ylimit" and called with a "ylim" in "..." intended for "par". That's just too horrible to contemplate. Simon Fear Senior Statistician Syne qua non Ltd Tel: +44 (0) 1379 644449 Fax: +44 (0) 1379 644445 email: Simon.Fear at synequanon.com web: http://www.synequano...
2007 Oct 26
0
"free" y-limits in xYplot
...library(Hmisc) xYplot( Cbind(mean, Lower, Upper) ~ date | response, groups = water, data = sum.sap, type = "l", lty = c(1, 2), col = "black", scales = list(y = list(relation = "free")), ) When I run this code, ylim for each panel is 0 - 350. I want the ylimits of each panel to differ. Any help would be appreciated- thanks- tim Running R 2.6 on MAC OS 10.4 ______________________ C. E. Timothy Paine Dept. of Biological Sciences 107 Life Sciences Building Louisiana State University Baton Rouge, LA 70803 225-344-3514 cetpaine@gmail.com 972 species...
2010 Mar 09
0
plotlmer graphics/x-axis and legend options
...=1.25, tcl=-0.5, las=2, cex.axis=0.7) 2. In the plotlmer graphic with an interaction, is it possible to remove the legend of the interacted factor? Again here is my code: plotLMER.fnc(idbase_lmer22bis, xlabel = "Competence in L2", xlabs = NA, ylabel = "Reaction time (ms)", ylimit =c(300,1300), fun = NA, pred = "Groupe", n = 100, intr=list("Lexical_status", c("Word", "PseudoWord"), "end", list(c("red", "blue"), lty=c(1,4), rep(1,2))), mcmcMat = NA, lockYlim = TRUE, addlines = TRUE, withList = FALSE,...
2009 Aug 19
0
font size on graphics
...lt;-WinDir setwd( save_at) x11() png(filename = paste(graf_1,setting[rol,1],".png",sep=""),width = setting[rol,2], height = setting[rol,3],pointsize = setting[rol,4], bg = "white", res = NA) plot(1:nrow(meanstable),meanstable$Mean, xlim=c(0,nrow(meanstable)),ylim= ylimits, xaxt='n', pch = 19, frame.plot=F,xlab='',ylab=lg10_label,cex.lab=setting[rol,6],cex.axis=setting[rol,8]) arrows(1:nrow(meanstable) , meanstable$Upper , 1:nrow(meanstable) , meanstable$Lower, lty=3, code = 3, angle = 45, length = .1) axis(3,at=1:2,unique(meanstable$Test)[c...
2009 Aug 19
0
font size on graphics question (correction in example,sorry)
...lt;-WinDir setwd( save_at) x11() png(filename = paste(graf_1,setting[rol,1],".png",sep=""),width = setting[rol,2], height = setting[rol,3],pointsize = setting[rol,4], bg = "white", res = NA) plot(1:nrow(meanstable),meanstable$Mean, xlim=c(0,nrow(meanstable)),ylim= ylimits, xaxt='n', pch = 19, frame.plot=F,xlab='',ylab=lg10_label,cex.lab=setting[rol,6],cex.axis=setting[rol,8]) arrows(1:nrow(meanstable) , meanstable$Upper , 1:nrow(meanstable) , meanstable$Lower, lty=3, code = 3, angle = 45, length = .1) axis(3,at=1:2,unique(meanstable$Test)[c(...
2013 Sep 19
3
lattice: double y - problem changing axis color after doubleYScale
Hi, I have had some troubles using doubleYScale. No matter what I try, I cant manage to change the color of the y-axis in the end. I have to produce a black and white plot. There is also something I do not understand regarding fontfamilyj="serif" when using it in: strip=strip.custom() Maybe someone has a better idea for defining which line and dots belong to which y-axis when not using