search for: lbs

Displaying 20 results from an estimated 58 matches for "lbs".

Did you mean: tlbs
2013 May 20
1
How to fit a normal inverse gaussian distribution to my data using optim
Dear R Help Please forgive my lack of knowledge,.I would be very thankful for some help. Here is my problem: I was using optim to estimate parameters of a model and I get this error message "Error in optim(x0, fn = riskll, method = "L-BFGS-B", lower = lbs, upper = ubs, : L-BFGS-B needs finite values of 'fn'" Below is the R code I have written. library('GeneralizedHyperbolic') data=read.table(file="MSCI_USA.csv",sep=',',header=T) data=data[1:8173,] #starting value x0 <- c(-0.011,0.146, 0.013, 0.639...
2007 Oct 01
4
how to plot a graph with different pch
...and colors. It should represent what is in the legend. I tried using the points command but this does not work. Is there another command in R that would allow me to use different symbols and colors for the points? Thank you kindly. data(mtcars) plot(mtcars$wt,mtcars$mpg,xlab= "Weight(lbs/1000)", ylab="Miles per Gallon") mtcars$wt.cyl<-mtcars$wt[mtcars$cyl] mtcars$mpg.cyl<-mtcars$mpg[mtcars$cyl] points(mtcars$wt.cyl, mtcars$mpg.cyl, pch = 17, col = "red") title("Motor Trend Data") text(2,10,"LTR",cex=1.2,adj=0,col=3) legend(4,...
2000 Apr 04
0
Obscure bug....?
...gram, and crashes happen at different places, with different error messages. To start somewhere, I have started on the warnings. The two most relevant functions are the following. All the "print"-calls are inserted for debugging: add.histogram <- function(h1, h2) { print(c(test=0,lbs1=length(h1$breaks),lbs2=length(h2$breaks))) if(length(h1$breaks) >= length(h2$breaks)) { bl <- h1$breaks bs <- h2$breaks cl <- h1$counts cs <- h2$counts mi <- h1$mids print(c(test=1,lbs=length(bs),lcs=length(cs),lbl=length(bl),lcl=length(cl))) } else {...
2003 Nov 07
1
y label after axis (4)
Hi, I am trying to figure out how to lable the second y-axis after the following codes: plot(x, y, xlab="time", ylab="pay1" ) par(new=TRUE) plot(x,y2, ann=FALSE, xaxt="n", yaxt="n", pch=7 ) axis(4) Then, I want to label the second y axis "pay2". I tried "title(ylab="pay2")", but it put this lable on the first
2010 Jul 14
2
Merging columns along time line
I am resending this, as I believe it has not arrived on the mailing list when I first emailed. I have a set of labels arranged along a timeframe in a. Each label has a timestamp and marks a state until the next label. The dataframe a contains 5 such timestamps and 5 associated labels. This means, on a continious scale between 1-100, there are 5 markers. E.g. 'abc' marks the timestampls
2002 Feb 12
1
problem plotting nls objects: couldn't find function "..."
...te(allV[naV], "not found in data")) } } } else data <- NULL if (inherits(data, "groupedData")) { ff <- formula(data) rF <- deparse(getResponseFormula(ff)[[2]]) cF <- deparse(getCovariateFormula(ff)[[2]]) lbs <- attr(data, "labels") unts <- attr(data, "units") if (!is.null(lbs$x)) cL <- paste(lbs$x, unts$x) else cF <- NULL if (!is.null(lbs$y)) rL <- paste(lbs$y, unts$y) else rF <- NULL } else...
2012 Nov 17
3
Reshaping a dataframe
Seems like this should be easy but I'm struggling a bit. How do I rearrange a data frame to go from the first one to the second shown below ? State Date lbs TX 200701 400 TX 200702 650 TX 200703 950 TX 200704 1000 FL 200701 200 FL 200702 300 FL 200703 500 FL 200704 333 NJ 200701 409 NJ 200702 308 NJ 200703 300 NJ 200704 800 Date TX FL NJ 200701 400 200 409 200702 650 300 308 200703 950 500 300 200704 1000 333 800 -- View th...
2006 May 23
11
New "made with Rails" site launched: www.invitika.com
We''ve finally finished up work on our application and are now beginning our beta. The site (SMS+mobile blogging+event planning+LBS+photos) is built using 100% Ruby on Rails. Many thanks to all the people who answered questions over the months on this list. Our experience with Rails was overwhelmingly positive! We''d love to hear any feedback you might have: http://www.invitika.com Thanks again, -elan -- Posted...
2009 Aug 16
4
How show validation errors in form_remote_tag?
...invalid entry. The controller uses a simple conditional with redirect_to to re-display the form if needed. I don''t understand how to reproduce this same straight-forward process when the form uses a form_remote_tag. Is there a simple, universal process for this, or does it really take 40 lbs of hacks to accomplish like the blogs all seem to suggest? If it makes any difference, I do not want some generic red box at the top of the page saying there''s errors below. I want the error messages displayed with the input fields. Quite lost -- clues appreciated. -- gw -- Posted via...
2004 Nov 10
1
HTTPS request via MSXML hangs on redirect
...occurs when the server answers on a request with HTTP status code "302" and a new URL in the HTTP header "location". SNOOPing into our application does'nt bring much plausible explanations for me. When sending a request to be redirected (i.e. "https://kundenservice.lbs.de/bw" redirects to "https://kundenservice.lbs.de/bw/") there comes no return to the app. It seems that the new URL is requested, but the WININET method InternetReadFile is missing. It comes when calling a non redirected request such like https://meine.deutsche-bank.de/mod/WebObj...
2005 Mar 09
2
Valin 2.0 released
Hi everyone, I'm pleased to announce the new and improved Valin 2.0, codename "Alexandre", released March 7th, featuring: - 6 lbs (2.7 kg) at birth - Pretty face - Built-in crying algorithm Screenshots are available at http://people.xiph.org/~jm/alexandre/ . Note that this new release is not open-source and only has two "users". Both co-authors are fine, but tired at this point. Jean-Marc & Nathalie
2009 Aug 19
2
line plot
Dear useRs, How can I draw a barplot, but instead of bars, I'd get lines? Thanks, Kind regards, Rafael. ____________________________________________________________________________________ [[elided Yahoo spam]] [[alternative HTML version deleted]]
2009 Oct 15
2
How to right-align labels in dotchart
I have only just discovered the joys of the dotchart (since I am reading William Cleveland's -- Sean Carmody The Stubborn Mule http://www.stubbornmule.net http://twitter.com/seancarmody [[alternative HTML version deleted]]
2010 May 02
2
Calculation error
Dear Rxperts, Running the following code: ======================================================= twlo=10; twhi=20; wt=154; vd=0.5; cl=0.046; tau=6; t=3; F=1; wtkg <- wt/2.2 # convert lbs to kg vd.pt <- wtkg * vd # compute weight-based vd (L) cl.pt <- wtkg * cl # compute CL (L/hr) k <- cl.pt/vd.pt # compute k (hr^-1) cave <- round((twhi - twlo)/log(twhi/twlo),2) doserate <- (cl.pt * cave)/F # maintenance dose (Dm) total_dose_...
2012 Mar 20
1
overriding "summary.default" or "summary.data.frame". How?
...op = FALSE] if (alphaSort) datf <- datf[ , sort(colnames(datf)), drop = FALSE] z <- lapply(datf, summary.factor, numLevels=numLevels) nv <- length(datf) nm <- names(datf) lw <- numeric(nv) nr <- max(unlist(lapply(z, NROW))) for(i in 1L:nv) { sms <- z[[i]] lbs <- format(names(sms)) sms <- paste(lbs, ":", format(sms, digits = digits), " ", sep = "") lw[i] <- ncw(lbs[1L]) length(sms) <- nr z[[i]] <- sms } z <- unlist(z, use.names=TRUE) dim(z) <- c(nr, nv) if(any(is...
2008 Nov 20
1
Load balancing Asterisk.
...ne most of them are optimized for web traffic rather than UDP voice packets. Does that matter? Would any load balancer do - or only specific models will work? my guess is any model will work, but some of them may not be able to handle the load. Any recommended models? I know there are some fancy LBs out there that can actually load balance based on the SIP session rather than something like IP, but I'm afraid to even look at the price tag. I'm more than fine with balancing by user IP address instead - if that works. :) Would appreciate any comments or ideas. Thanks! -- Nitzan Kon, C...
2006 Apr 18
12
Formatting data drawn from a DB
Question for all: Right now i have a Table in a mySQL DB that has a row called Ingredients. When the data is entered into the DB its enter like so from a text area: 1 1/2 lbs. beef top sirloin, thinly sliced 1/3 cup white sugar 1/3 cup rice wine vinegar 2 tablespoons frozen OJ concentrate 1 teaspoon salt 1 tablespoon soy sauce 1 cup long grain rice 2 cups water 1/4 cup cornstarch 2 teaspoons orange zest 3 tablespoons grated fresh ginger 1 1/2 tablespoons minced garlic 2...
2013 Mar 28
2
ggplot2: less than equal sign
Hi I am trying to add a less than equal sign to a plot. I have previously done this using unicode but is not working in this instance. Any suggestions would be great thanks example code: library(ggplot2) df<-data.frame(vis=c(0,0,1,1) , count=c(10,15,20,10) , grp=c(0,1,0,1)) df$grp <-factor(df$grp ,levels=c(0,1) , labels =c("x \u2265 10" , "x > 10")) ggplot(df,
2004 Nov 23
2
Quadratic curve on a loop
...################################### for (i in 1:length(levels(site))) { j <- site == levels(site)[i] x <- nrate[j] y <- yield[j] out <- try(lm(y ~ x + I(x^2)), silent = TRUE) plot(y ~ x, pch = 16, xlab = expression(paste("Nitrogen rate [lbs ac" ^-1,"]")), ylab = expression(paste("Corn yield [bu ac"^-1,"]"))) curve(predict(out, data.frame(nrate = x)), add = T) title(paste("Site", i)) # dev.copy2eps(file = fname[i], horizontal = TRUE) } ################...
2006 Aug 12
6
params not getting POSTed
...e rendering this is the html that I get... <form action="/stats/new" method="post"> Height: <input id="stat_height_ft" name="stat[height_ft]" size="5" type="text" />ft </p> Weight: <input id="stat_weight_lbs" name="stat[weight_lbs]" size="5" type="text" />lbs </p> <input name="commit" type="submit" value="Save" /> </form> Why would this result in a GET not a POST and no params being sent? -- Posted via http://www...