search for: max_x

Displaying 6 results from an estimated 6 matches for "max_x".

Did you mean: max_e
2005 Oct 06
3
playing with R: make a animated GIF file...
...with R-package " logoWidth = 1.5 logoHeight = 2.5 L = nchar(yourLogo) TrigSplit = 360 / L yourLogo = strReverse(yourLogo) posx = numeric(L) posy = numeric(L) for( i in 0:L){ posx[i] = logoHeight * sin(i * TrigSplit * pi / 180) posy[i] = logoWidth * cos(i * TrigSplit * pi / 180) } max_x = max(posx)*1.1 max_y = max(posy)*3 min_x = min(posx)*1.1 min_y = min(posy)*3 cex = 2/(posy + 2) idx = 1:L for(j in 1:L-1) { ###################file = paste("CQM_",j,".png",sep="") ###################png(filename=file, bg="transparent") plot(0,t='...
2006 Oct 17
0
[680] trunk/wxruby2/samples/printing/printing.rb: Cleaned up to use the Ruby naming convention, added #! line, now uses Wx default ID''s in standard menu items.
...ot;> </span><span class="cx"> # We know the graphic is 200x200. If we didn''t know this, </span><span class="cx"> # we''d need to calculate it. </span><del>- maxX = 200 - maxY = 200 </del><ins>+ max_x = 200 + max_y = 200 </ins><span class="cx"> </span><span class="cx"> # Let''s have at least 50 device units margin </span><del>- marginX = 50 - marginY = 50 </del><ins>+ margin_x = 50 + margin_y = 50 &lt...
2011 Feb 25
0
Fitting distribution in range
...x(x) of the fitted distribution will be one. Therefore I have wrote my own log-likelihood functions and then I am using mle {stats4}. So, for example: ll_gamma <- function(a,b) { integrand <- function(y){dgamma(y, shape=a, rate=b)} integ_res <- tryCatch({integrate(integrand,min_x,max_x)$value}, error=function(err){0}); if (integ_res == 0) { return(NA) } C = 1 / integ_res res = -(sum(log(C*dgamma(x,shape=a,rate=b)))) return(res) } m <- mean(x) v <- var(x) fit <- mle(minuslog=ll_gamma,start=list(a=m^2/v,b=m/v)) Now, for some reason I get very weird resul...
2011 Mar 22
0
Diagonal population density
...in(fx)) #Relative Marginal Density in X fy<-rowSums(city$data) fy<-(fy-min(fy))/(max(fy)-min(fy)) #Relative Marginal Density in Y image(x,y,t(city$data),xlab="",ylab="") #plotting city ### plotting fuzzy membership function of city contour(color(fcity,min_x=min(x),max_x=max(x),min_y=min(y),max_y=max(y),px=length(x),py=length(y),n=n,operator=operator),add=T,xlab="",ylab="",lwd=1.5) ### par(mar=c(0,3,1,1)) #upper-left corner ### plot fuzzy membership function of X plot(fcity$x,c(0,1,1,0),type="l",axes=F,frame.plot=TRUE,xlab=&q...
2007 May 22
0
[1030] trunk/wxruby2/samples/printing/printing.rb: Fix so will print again.
..._size </del><ins>+ size = dc.get_size + w = size.get_width + h = size.get_height </ins><span class="cx"> </span><span class="cx"> # Calculate a suitable scaling factor </span><span class="cx"> scale_x=(w/max_x) </span><span class="lines">@@ -306,7 +308,9 @@ </span><span class="cx"> # Now we have to check in case our real page size is reduced </span><span class="cx"> # (e.g. because we''re drawing to a print preview memory D...
2008 Aug 24
2
Missing ids in documentation
...</h3> dc.html:<h3>DC#gradient_fill_linear</h3> dc.html:<h3>DC#logical_to_device_x</h3> dc.html:<h3>DC#logical_to_device_xrel</h3> dc.html:<h3>DC#logical_to_device_y</h3> dc.html:<h3>DC#logical_to_device_yrel</h3> dc.html:<h3>DC#max_x</h3> dc.html:<h3>DC#max_y</h3> dc.html:<h3>DC#min_x</h3> dc.html:<h3>DC#min_y</h3> dc.html:<h3>DC#is_ok</h3> dc.html:<h3>DC#reset_bounding_box</h3> dc.html:<h3>DC#set_axis_orientation</h3> dc.html:<h3>DC#set_backgro...