Displaying 20 results from an estimated 1000 matches similar to: "Example function for bigglm (biglm) data input from file"
2010 Jul 02
2
unable to get bigglm working, ATTN: Thomas Lumley
I am using an example posted in this help forum to work with a file. the head
of the file looks like:
988887 2007-03-05 2007-06-01 90 3 5.450 205500.00 999.00 999.000 0.000 0 0
988887 2007-03-06 2007-06-01 90 3 5.450 205500.00 999.00 999.000 0.000 1 0
988887 2007-03-07 2007-06-01 90 3 5.450 205500.00 999.00 999.000 -0.100 2 0
988887 2007-03-08 2007-06-01 90 3 5.450 205500.00 999.00 999.000 -0.100
2009 Jul 03
2
bigglm() results different from glm()
Hi Sir,
Thanks for making package available to us. I am facing few problems if
you can give some hints:
Problem-1:
The model summary and residual deviance matched (in the mail below) but
I didn't understand why AIC is still different.
> AIC(m1)
[1] 532965
> AIC(m1big_longer)
[1] 101442.9
Problem-2:
chunksize argument is there in bigglm but not in biglm, consequently,
2007 Jun 29
1
Comparison: glm() vs. bigglm()
Hi,
Until now, I thought that the results of glm() and bigglm() would
coincide. Probably a naive assumption?
Anyways, I've been using bigglm() on some datasets I have available.
One of the sets has >15M observations.
I have 3 continuous predictors (A, B, C) and a binary outcome (Y).
And tried the following:
m1 <- bigglm(Y~A+B+C, family=binomial(), data=dataset1, chunksize=10e6)
2009 Apr 03
1
bigglm "update" with ff
Hi, since bigglm doesn't have update, I was wondering how to achieve
something like (similar to the example in ff package manual using biglm):
first <- TRUE
ffrowapply ({
if (first) {
first <- FALSE
fit <- bigglm(eqn, as.data.frame(bigdata[i1:i2,,drop=FALSE]), chunksize =
10000, family = binomial())
} else {
fit <- update(fit,
2011 Jan 10
1
debug biglm response error on bigglm model
G'morning
What does the error message "Error in x %*% coef(object) : non-
conformable arguments" indicate when calculating the response values
for
newdata with a model from bigglm (in package biglm), and how can I
debug it? I am attempting to do Monte Carlo simulations, which may
explain the loop in the code that follows. After the code I
have included the output, which shows that
2010 Mar 02
1
bigglm Memory Issues
Hi all,
I'm somewhat of a novice in terms of programming, so I thought I'd come here to seek some help with an issue I'm having.
I'm trying to model a glm using bigglm, but in spite of my best efforts, I cannot get it to work!
Here is the particular line of code that is giving me trouble:
>mod = bigglm(Pres/wt ~ Xdes, data=dat, family=poisson(), weights = ~wt, maxit=100,
2009 Mar 17
2
bigglm() results different from glm()
Dear all,
I am using the bigglm package to fit a few GLM's to a large dataset (3
million rows, 6 columns). While trying to fit a Poisson GLM I noticed
that the coefficient estimates were very different from what I obtained
when estimating the model on a smaller dataset using glm(), I wrote a
very basic toy example to compare the results of bigglm() against a
glm() call. Consider the
2012 May 31
2
bigglm binomial negative fitted value
Hi, there
Since glm cannot handle factors very well. I try to use bigglm like this:
logit_model <- bigglm(responser~var1+var2+var3, data, chunksize=1000,
family=binomial(), weights=~trial, sandwich=FALSE)
fitted <- predict(logit_model, data)
only var2 is factor, var1 and var3 are numeric.
I expect fitted should be a vector of value falls in (0,1)
However, I get something like this:
2007 Feb 12
0
predict on biglm class
Hi Everyone,
I often use the 'safe prediction' feature available through glm().
Now, I'm at a situation where I must use biglm:::bigglm.
## begin example
library(splines)
library(biglm)
ff <- log(Volume)~ns(log(Girth), df=5)
fit.glm <- glm(ff, data=trees)
fit.biglm <- bigglm(ff, data=trees)
predict(fit.glm, newdata=data.frame(Girth=2:5))
## -1.3161465 -0.2975659
2010 Nov 10
0
biglm and epicalc ROC curves
Hello list,
I am trying to avoid "Rifying" some of my SAS code to generate ROC
plots, and the logistic.display() and lroc() functions in the epicalc
package do what I want. However, I must generate my logistic model
with bigglm because I have 1) limited hardware, 2) ~2.5 million rows,
and 4 categorical and 2 continuous independent variables. When I
attempt to invoke epicalc's
2004 Nov 05
0
R check passes code and docs that don't match
I have code and documentation that don't match, but R CMD check didn't
flag it.
in mspath.R
mspath <- function(formula, # formula with observed Markov states
~ observation times (required)
qmatrix, # matrix of 1s and 0s with indices of
allowed transitions (diagonal is ignored) (required)
misc = FALSE,
ematrix = NULL, # matrix
2011 Feb 08
1
Fitting a model with an offset in bigglm
Dear all,
I have a large data set and would like to fit a logistic regression
model using the bigglm function. I need to include an offset in the
model but when I do this the bigglm function seems to ignore it.
For example, running the two models below produces the same model and
the offset is ignored
bigglm(y~x,offset=z,data=Test,family=binomial(link = "logit"))
2010 Jun 16
0
biglm.big.matrix: Problem with weighting
Hello colleagues,
I have tried to use the package bigmemory, biganalytics and biglm. I
want to specify a multivariate regression with a weight.
I have imported a large dataset with the library(bigmemory). I load the
library (biglm) and specified a regression with a weight. But I get
everytime an error message like "object not found" or "`weights' must be
a
2012 Jan 03
0
Biglm source code alternatives (E.g. Call to Fortran)
Hi everyone,
I have been looking at the Bigglm (Basically does Generalised Linear Models
for big data under the Biglm package) command and I have done some profiling
on this code and found that to do a GLM on a 100mb file (9 million rows by 5
columns matrix(most of the numbers were either a 0,1 or 2 randomly
generated)) it took about 2 minutes on a linux machine with 8gb of RAM and 4
cores.
2009 Mar 17
1
exporting s3 and s4 methods
If a package defined an S3 generic and an S4 generic for the same function (so as to add methods for S4 classes to the existing code), how do I set up the namespace to have them exported?
With
import(stats)
exportMethods(bigglm)
importClassesFrom(DBI)
useDynLib(biglm)
export(biglm)
export(bigglm)
in NAMESPACE, the S3 generic is not exported.
> methods("bigglm")
[1] bigglm.RODBC*
2010 Oct 31
1
biglm: how it handles large data set?
I am trying to figure out why 'biglm' can handle large data set...
According to the R document - "biglm creates a linear model object that uses
only p^2 memory for p variables. It can be updated with more data using
update. This allows linear regression on data sets larger than memory."
After reading the source code below? I still could not figure out how
'update'
2006 Nov 13
0
question on MSM warning message
Hello
After (simple random cluster) resampling with replacement I ran MSM
function and I'm getting the following warning message ,which I'm not
sure why. I don't have any absorbing stage set up in my MSM model. I
have a 4 stage uni-directional MSM model. The only thing I see might be
a problem is that when the last stage (stage 4 in my data) gets repeated
it seems to give me a warning
2006 Dec 21
1
multinom(nnet) analogy for biglm package?
I would like to perform a multinomial logistic regression on a large
data set, but do not know how. I've only thought of a few possibilities
and write to seek advice and guidance on them or deepening or expanding
my search.
On smaller data sets, I have successfully loaded the data and issued
commands such as:
length(levels(factor(data$response)))
[1] 6 # implies polychotomy
library(nnet)
2009 Feb 19
1
Questions about biglm
Hello folks,
I am very excited to have discovered R and have been exploring its
capabilities. R's regression models are of great interest to me as my
company is in the business of running thousands of linear regressions
on large datasets.
I am using biglm to run linear regressions on datasets that are as
large as several GB's. I have been pleasantly surprised that biglm
runs the
2009 Jul 09
2
How to Populate List
Hi,
I'm new to R and would like to know, how one can populate the list with array data.
I'm reading a tab separated table in R. The data in the table looks something like this.
#Table Data
Comp A B C
Extracellular 103 268 535759
Nucleus 45603 47783 442744
#R code
myData <- read.table("table.data",
header=T,