search for: linewidth

Displaying 20 results from an estimated 39 matches for "linewidth".

2006 May 08
1
persp or wireframe 3D plot: how can I independently adjust linewidth of the 'surface' and framebox?
It is a trivial matter to adjust the linewidth of the axes and plot line in a 2D plot: x <- 1:10; y <- 1:10; par(lwd=2); # axis (and others) linewidth plot(x,y,"l",lwd=6); # plot linewidth Is there anything comparable to this for persp or wireframe? I've tried a number of ways, and the framebox/axes seem to be linked...
2007 Oct 04
1
linewidth in Rgraphviz
...widths of edges: see https://mailman.research.att.com/pipermail/graphviz-interest/2001q2/000051.html (although it looks a little obscure even in graphviz). [As discussed in the thread above, the "weight" parameter in Rgraphviz sets the parameters of the graph layout algorithm, NOT the linewidth of the edge itself.] I can probably figure this out given enough hours, but if someone were able to put together an example in a few minutes (or know that it's impossible or very difficult) I would be grateful ... cheers Ben Bolker -- View this message in context: http://www.nabb...
2000 Feb 11
2
R hangs sometimes and crashes (PR#429)
Full_Name: Kjetil Kjernsmo Version: 0.65.1 OS: Digital UNIX 4.0 Submission from: (NULL) (129.240.28.172) I have the following R code: ncloudsbin <- function(binno, ntotalclouds, numberofbins = 100, linewidth = numberofbins / 6) return(ntotalclouds * dnorm(binno, sd = linewidth)) photonsincidenttodetectorbin <- function(binno, ntotalclouds, avgphotonfromcloud, ampmode = 1, ampmean = 2, numberofbins = 100, linewidth = numberofbins / 6) { sc <- ampmean - ampmode if(sc <= 0) stop("Mean...
2000 Feb 15
1
rpois gives a large number repeatedly (PR#439)
...distribution with a parameter of 3 shouldn't see the number 1932 very often, but the same, incredibly high number is drawn repeatedly. These are the two relevant functions, the latter somewhat expanded for debugging purposes. ncloudsbin <- function(binno, ntotalclouds, numberofbins = 100, linewidth = numberofbins / 6) return(ntotalclouds * dnorm(binno, sd = linewidth)) photonsincidenttodetectorbin <- function(binno, ntotalclouds, avgphotonfromcloud, ampmode = 1, ampmean = 2, numberofbins = 100, linewidth = numberofbins / 6) { sc <- ampmean - ampmode if(sc <= 0) stop("Mean...
2008 Feb 12
1
controlling the edge linewidth in Rgraphviz
Hello, I would like to have different linewidths for the edges of my graph. I read the documentation but could not find how to control this. On the Graphviz help page I've seen that there is something called "penwidth" but I could not find it in the R edge attributes. Thanks a lot for any help. Adrian Dragulescu
2008 Feb 12
0
[Fwd: Re: controlling the edge linewidth in Rgraphviz]
...lwd=2))) There is a Vignette that explains all the new stuff. Florian > http://finzi.psych.upenn.edu/R/Rhelp02a/archive/111006.html > > On Feb 11, 2008 9:56 PM, Adrian Dragulescu <adrian_d at eskimo.com> wrote: > >> Hello, >> >> I would like to have different linewidths for the edges of my graph. I >> read the documentation but could not find how to control this. On the >> Graphviz help page I've seen that there is something called "penwidth" but I >> could not find it in the R edge attributes. >> >> Thanks a lot for...
2001 Jan 09
1
Setting fontsize in dev.copy2eps
...maller, but so is the text. Legend text still expands outside the legend box. All works well if I leave out the width and height arguments to dev.copy2eps. But then, the figure gets too large, and scaling down the figure to a reasonable size when including the figure in a document, things like linewidth become to small. The only way out of this as I see it (apart from not using dev.copy2eps) is to enlarge all objects like linewidths, fontsizes, etc. So, when the figure is scaled down (when including it in a document, leaving it at its default size at the moment of saving with dev.copy2eps), the l...
2010 Apr 17
2
Question regarding R plot
...tes<-read.table("rates_values.txt",header=T) attach(rates) scores<-function(x){ l<-length(rateValue) total<-0 for(i in 1:l){ value<-16*rateValue[i]*rateValue[i]*x*exp(-4*rateValue[i]*x) total<-total+value } return(total) } #------- #preparing the plot linewidth=3 linetype=3 color="blue" xvalue=0.5 plot(scores,xvalue,0,type="n",font.axis=2,xlim=c(xvalue,0)) curve(scores,xvalue,add=TRUE,col=color,lty=linetype,lwd=linewidth,xlim=c(xvalue,0)) #------- Can anyone help me figure out how to determine the peak (maximum "scores") v...
2004 Mar 11
1
Difficulties in interaction between R and latex (prosper)
...ype="l") I fed this into a simplest-possible tex file, named sl_demo.tex, which uses prosper: \documentclass[pdf,serpaggi,slideColor,colorBG]{prosper} \usepackage[latin1]{inputenc} \usepackage{graphicx} \begin{document} \begin{slide}{Demo} \includegraphics[width=\linewidth]{cm_test.eps} \end{slide} \begin{slide}{This one works} \includegraphics[width=\linewidth]{thisworks.eps} \end{slide} \end{document} The file cm_test.eps is produced using R. I left a file "thisworks.eps" there as a counterpoint (it was made using jgraph and it w...
2000 May 07
1
Problem with match.arg() (PR#536)
...") directly with no problems. In my code, ramp is called by a function that is called by a function, that is... :-) However, the code isn't very involved, really, so if you want to try, here it is: ncloudsbin <- function(binno, ntotalclouds, numberofbins = 100, linewidth = numberofbins / 6) return(ntotalclouds * dnorm(binno, sd = linewidth)) intensityfromcloud <- function(ncloudsbin, cloudintensity, exptime, amptype) return(cloudintensity * exptime * ramp(ncloudsbin, amptype)) photonsdetectedbin <- function(ncloudsbin, intensityfromcloud,...
2009 Jun 04
0
type = 'b' with Grid
...?, ...) Regards, baptiste # code reproduced below, barbedGrob <- function( x = 1:10/12, y = sin(1:10)/3+0.5, size=1, shape=21, space=1, colour="red", fill="blue", linetype=1, linewidth=1){ n <- length(x) dx <- diff(x) dy <- diff(y) # duplicate the points to make split segments new.x <- rep(x, each=2)[-c(1, 2*length(x))] new.y <- rep(y, each=2)[-c(1, 2*length(y))] new.size <- rep(size, each=2, length=2*n)[-c(1, 2*n)] length <- sqrt(dx^2 + dy^2) # len...
2023 Aug 12
1
geom_smooth
...int()+ geom_smooth(se=TRUE,fill="blue",color="black",linetype="dashed")+ theme_cowplot() # this is a data.frame, relevant columns are x, ymin and ymax fit <- ggplot_build(p)$data[[2]] p + geom_line(data = fit, aes(x, ymin), linetype = "dashed", linewidth = 1) + geom_line(data = fit, aes(x, ymax), linetype = "dashed", linewidth = 1) Hope this helps, Rui Barradas
1997 Sep 08
1
R-alpha: Re: lwd, cex and par(.) issues [was "... windows quirks .."]
...;cex": There are situations where ALL text and plotting characters should just be made bigger with the same zoom factor. Below, you (RG) mention the use of par(lwd=...) {and correspondingly would be par(cex=...)}. Is this going to be ``the standard'': For global changes of linewidth or character size, one must use par(lwd=..) or par(cex=..) ? RG> gives you everything in red; axes, labels, lines and RG> points. That's wrong. In plot(1:4,type="l",lwd=2) lwd should RG> affect the width of the line joining the points but not the width...
2005 Jan 06
2
autoscaling plot font size in Sweave output possible?
...--------->8--- \documentclass{article} \usepackage{graphicx} \newcommand{\mytext}{Some normal sized text. Some normal sized text. Some normal sized text. Some normal sized text.} \begin{document} \SweaveOpts{prefix.string=pics/miniexample} \mytext\par %% small plot: \setkeys{Gin}{width=.45\linewidth} @ <<test0,echo=F,fig=T>>= x <- 1:10 y <- sin(x) plot(x,y, xlab="some x label", ylab="some y label" ) @ %def \par\mytext \mytext %% normal sized plot: \setkeys{Gin}{width=.9\linewidth} @ <<test1,echo=F,fig=T>>= plot(x,y, xl...
2003 May 08
2
border of bars in lattice barchart
Hello! How to change a color (or linewidth) of border in lattice 'barchart'? I am trying barchart( (......) - my arguments panel=function(x,y,color,subscripts,groups,...) { panel.barchart(x=x,y=y,box.ratio=2,col=color,border=FALSE) })) or ... panel.barchart(x=x,y=y,box.ratio=2,col=color,border...
2012 Mar 20
0
[LLVMdev] Runtime linker issue wtih X11R6 on i386 with -O3 optimization
...wing code: void uxa_check_poly_lines(DrawablePtr pDrawable, GCPtr pGC, int mode, int npt, DDXPointPtr ppt) { ScreenPtr screen = pDrawable->pScreen; UXA_FALLBACK(("to %p (%c), width %d, mode %d, count %d\n", pDrawable, uxa_drawable_location(pDrawable), pGC->lineWidth, mode, npt)); if (pGC->lineWidth == 0) { if (uxa_prepare_access(pDrawable, UXA_ACCESS_RW)) { if (uxa_prepare_access_gc(pGC)) { fbPolyLine(pDrawable, pGC, mode, npt, ppt); uxa_finish_access_gc(pGC); } uxa_finish_access(pDrawable); } return; } /* fb calls mi functions in...
2006 Nov 12
1
[PATCH] Annotate shapes, text and dbus support
...(option, nOption, "root", 0); + + tool = getStringOptionNamed (option, nOption, "tool", "Brush"); + + s = findScreenAtDisplay (d, xid); + + if (s) + { + + cr = annoCairoContext (s); + + if (cr) + { + unsigned short *fillColor, *strokeColor; + double lineWidth, strokeWidth; + + ANNO_DISPLAY (d); + + cairo_set_operator (cr, CAIRO_OPERATOR_OVER); + cairo_set_line_cap (cr, CAIRO_LINE_CAP_ROUND); + + /*fillColor = getColorOptionNamed (option, nOption, "fill_color", + ad->opt[ANNO_DISPLAY_OPTION_FILL_COLOR].value.c); + st...
2006 Jan 05
3
problem with using lines command on windows XP machine
...est it I use the following code: x = c(-1,0,1) y = c(-1,0,1) plot(x,y, type="l", xlim=c(-1,1), ylim=c(-1,1)) lines(0) If I understand the documentation right this should draw a line (with default settings, I'm not setting any parameters) at x=0. I tried goofing around a bit setting linewidth and color differently, I tried using xy.coords etc, but no line appeared in the graph. The commands abline and segments work perfectly fine (so I am now using segments to plot the line I want), but I still think the lines command should work. Does anybody has similar problems drawing lines on XP...
2009 Jan 05
2
Sweave data-figure coupling
...lab="probability density") lik <- dbinom(60, 100, thetas) lik.p <- prior * lik post <- lik.p / sum(lik.p) matplot(thetas, cbind(prior, lik, post), type="l", lty=c(2, 1, 1), xlab="theta", ylab="probability density") @ \includegraphics[width=\linewidth]{test-binom-sim-fig} \end{document} ---<--------------------cut here---------------end--------------------->--- If the embedded chunks are evaluated directly in an R session, two different panel data are produced by layout(), as expected. However, when weaving and latexing the file produc...
2023 Aug 12
2
geom_smooth
Colleagues, Here is my reproducible code for a graph using geom_smooth set.seed(55) scatter_data <- tibble(x_var = runif(100, min = 0, max = 25) ?????????????????????? ,y_var = log2(x_var) + rnorm(100)) library(ggplot2) library(cowplot) ggplot(scatter_data,aes(x=x_var,y=y_var))+ ? geom_point()+ ? geom_smooth(se=TRUE,fill="blue",color="black",linetype="dashed")+