Displaying 20 results from an estimated 1100 matches similar to: "test for the variance of a normal population"
2006 Feb 06
3
power and sample size for a GLM with poisson response variable
Hi all,
I would like to estimate power and necessary sample size for a GLM with
a response variable that has a poisson distribution. Do you have any
suggestions for how I can do this in R? Thank you for your help.
Sincerely,
Craig
--
Craig A. Faulhaber
Department of Forest, Range, and Wildlife Sciences
Utah State University
5230 Old Main Hill
Logan, UT 84322
(435)797-3892
2006 Mar 08
1
power and sample size for a GLM with Poisson response variable
Craig, Thanks for your follow-up note on using the asypow package. My
problem was not only constructing the "constraints" vector but, for my
particular situation (Poisson regression, two groups, sample sizes of
(1081,3180), I get very different results using asypow package compared
to my other (home grown) approaches.
library(asypow)
pois.mean<-c(0.0065,0.0003)
info.pois <-
2010 Oct 07
3
quantile regression
Dear all,
I am a new user in r and I am facing some problems with the quantile regression specification. I have two matrix (mresultb and mresultx) with nrow=1000 and ncol=nsim, where I specify (let's say) nsim=10. Hence, the columns in my matrix represents each simulation of a determined variable. I need to regress each column of mresultb on mresultx. My codes are the following:
2010 Oct 13
1
(no subject)
Dear all,
I have just sent an email with my problem, but I think no one can see the red part, beacuse it is black. So, i am writing again the codes:
rm(list=ls()) #remove almost everything in the memory
set.seed(180185)
nsim <- 10
mresultx <- matrix(-99, nrow=1000, ncol=nsim)
mresultb <- matrix(-99, nrow=1000, ncol=nsim)
N <- 200
I <- 5
taus <- c(0.480:0.520)
h <-
2007 Oct 11
3
reason for error in small function?
Running the function below, tested using the cardiff dataset from
splancs generates the following error. What changes do I need to
make to get the function to work? Thanks. --Dale
> gen.rpoints(events, poly, 99)
> rpoints
Error: object "rpoints" not found
# test spatial data
library(splancs)
data(cardiff)
attach(cardiff)
str(cardiff)
events <- as.points(x,y)
###
2010 Oct 13
4
loop
Dear all,
I am trying to run a loop in my codes, but the software returns an error: "subscript out of bounds"
I dont understand exactly why this is happenning. My codes are the following:
rm(list=ls()) #remove almost everything in the memory
set.seed(180185)
nsim <- 10
mresultx <- matrix(-99, nrow=1000, ncol=nsim)
mresultb <- matrix(-99, nrow=1000, ncol=nsim)
N
2006 Jul 20
1
Loss of numerical precision from conversion to list ?
I?m working on an R-implementation of the simulation-based finite-sample null-distribution of (R)LR-Test in Mixed Models (i.e. testing for Var(RandomEffect)=0) derived by C. M. Crainiceanu and D. Ruppert.
I'm in the beginning stages of this project and while comparing quick and dirty grid-search-methods and more exact optim()/optimize()-based methods to find the maximum of a part of the
2011 Nov 07
1
How do I return to the row values of a matrix after computing distances
## Package Needed
library(fields)
## Assumptions
set.seed(123)
nsim<-5
p<-2
## Generate Random Matrix G
G <- matrix(runif(p*nsim),nsim,p)
## Set Empty Matraces dmax and dmin
dmax<- matrix(data=NA,nrow=nsim,ncol=p)
dmin<- matrix(data=NA,nrow=nsim,ncol=p)
## Loop to Fill dmax and dmin
for(i in 1:nsim) {
dmax[i]<- max(rdist(G[i,,drop=FALSE],G))
dmin[i]<-
2011 Feb 17
1
How to speed up a for() loop
Dear all,
Does anyone have any idea on how to speed up the for() loop below.
Currently it takes approximately 2 minutes and 30 seconds.
Because of the size of Nsim and N, simulating a multivariate normal
(instead of simulating Nsim times a vector of N normal distributions)
would require too much memory space.
Many thanks for your kind help,
Simona
N=3000
PD=runif(N,0,1)
cutoff.=qnorm(PD)
2012 Nov 23
1
Spatstat: Mark correlation function
I normally use the following code to create a figure displaying the mark
correlation function for the point pattern process "A":
M<-markcorr(A)
plot(M)
I have now started to use the following code to perform 1000 Monte Carlo
simulations of Complete Spatial Randomness (CSR). It is a Monte Carlo test
based on envelopes of the Mark correlation function obtained from simulated
point
2007 Oct 03
2
Speeding up simulation of mean nearest neighbor distances
I've written the function below to simulate the mean 1st through nth
nearest neighbor distances for a random spatial pattern using the
functions nndist() and runifpoint() from spatsat. It works, but runs
relatively slowly - would appreciate suggestions on how to speed up
this function. Thanks. --Dale
library(spatstat)
sim.nth.mdist <- function(nth,nsim) {
D <- matrix(ncol=nth,
2009 Sep 02
1
problem in loop
Hi R-users,
I have a problem for updating the estimates of correlation coefficient in simulation loop.
I want to get the matrix of correlation coefficients (matrix, name: est) from geese by using loop(500 times) .
I used following code to update,
nsim<-500
est<-matrix(ncol=2, nrow=nsim)
for(i in 1:nsim){
fit <- geese(x ~ trt, id=subject, data=data_gee, family=binomial,
2007 Dec 04
1
Metropolis-Hastings within Gibbs coding error
Dear list,
After running for a while, it crashes and gives the following error message: can anybody suggest how to deal with this?
Error in if (ratio0[i] < log(runif(1))) { :
missing value where TRUE/FALSE needed
################### original program ########
p2 <- function (Nsim=1000){
x<- c(0.301,0,-0.301,-0.602,-0.903,-1.208, -1.309,-1.807,-2.108,-2.71) # logdose
2011 Apr 07
2
Two functions as parametrs of a function.
Hi R users:
I'm trying to make a function where two of the parameters are
functions, but I don't know how to put each set of parameters for
each function.
What am I missing?
I try this code:
f2<-function(n=2,nsim=100,fun1=rnorm,par1=list(),fun2=rnorm,par2=list()){
force(fun1)
force(fun2)
force(n)
p1<-unlist(par1)
p2<-unlist(par2)
force(p1)
force(p2)
2012 Feb 18
3
foreach %do% and %dopar%
Hi everyone,
I'm working on a script trying to use foreach %dopar% but without success,
so I manage to run the code with foreach %do% and looks like this:
The code is part of a MCMC model for projects valuation, returning the most
important results (VPN, TIR, EVA, etc.) of the simulation.
foreach (simx = NsimT, .combine=cbind, .inorder=FALSE, .verbose=TRUE) %do% {
MCPVMPA = MCVAMPA[simx]
2011 Apr 06
1
Use of the dot.dot.dot option in functions.
Hi R users:
I try this code, where "fun" is a parameter of a random generating
function name, and I pretend to use "..." parameter to pass the parameters
of different random generating functions.
What am I doing wrong?
f1<-function(nsim=20,n=10,fun=rnorm,...){
vp<-replicate(nsim,t.test(fun(n,...),fun(n,...))$p.value)
return(vp)
}
This works!
f1()
2013 Apr 10
2
[LLVMdev] How to call the llvm.prefetch intrinsic ?
Hello,
Can anyone please guide me how can I replace a load instruction with a prefetch. I was looking at the intrinsic creation methods of the IRBuilder, but I can only find functions corresponding to memset, memcpy and memmove intrinsics, not for prefetching.
Also, I target x86-64 architectures. Is it sufficient to insert a call to the intrinsic in the LLVM IR to have the corresponding prefetch
2010 Nov 08
1
try (nls stops unexpectedly because of chol2inv error
Hi,
I am running simulations that does multiple comparisons to control.
For each simulation, I need to model 7 nls functions. I loop over 7 to do
the nls using try
if try fails, I break out of that loop, and go to next simulation.
I get warnings on nls failures, but the simulation continues to run, except
when the internal call (internal to nls) of the chol2inv fails.
2011 Jul 27
3
[LLVMdev] scalar evolution to determine access functions in arays
Hello,
How can I compute the functions on the loop iterators used as array indices?
For example:
for i = 0, N
for j = 0, M
A[2*i + j - 10] = ...
Can I obtain that this instruction A[2*i + j - 10]= .. always accesses memory using a function f(i,j) = 2*i + j - 10 + base_address_of_A
If I run the scalar evolution pass on this code I obtain:
%arrayidx =
2012 Nov 22
2
[LLVMdev] Set the minimum number of allocated bits for a variable
Hi,
I would like to force the minimum number of bits allocated for a variable in memory to be 16. From what I have seen, i1 is already represented on 8 bits. So, the only change would be to represent i1 and i8 on 16 bits, as all other types already fulfill this condition.
TargetData can help by setting a higher alignment, thus although the type is i1 or i8, the number of allocated bits is 16.