Displaying 20 results from an estimated 98 matches for "zeta".
Did you mean:
beta
2007 Dec 02
1
speeding up likelihood computation
...BLES AND ROWS REFER
# TO OBSERVATIONS.
########## PARAMETERS ###############################
# alpha: interaction between son targeting and family size
# beta : son targeting
# gamma : family size
# delta : a 1x6 vector of probabilities of male birth at various parities (q1, q2, q3, q4, q5, q6)
# zeta : a 1x11 vector of conditional probabilities with zeta[1]=1 always
alpha <- paramets[1] # FIRST PARAMETER
beta <- paramets[2:9] # SECOND TO SEVENTH PARAMETER
gamma <- paramets[10:16]
delta <- paramets[17]
zeta <- paramets[18:27] # LAST 10 PARAMETERS
################# VAR...
2010 Nov 16
2
Integrating functions / vector arithmetic
...rval using the function 'integrate' from the 'stats' package. As an
example, please consider the function
h(u)=sin(pi*u) + sqrt(2)*sin(pi*2*u) + sqrt(3)*sin(pi*3*u) + 2*sin(pi*4*u)
Two alternative ways to 'build' this function are as in f and g below:
coeff<-sqrt(1:4)
zeta<-function(i) {force(i); function(u){
zeta<-sqrt(2)+sin(pi*i*u)
}}
f<-function(u){
f<-0
for (j in 1:4){
f<-f+coeff[j]*(zeta(j)(u))
}
f<-f
}
g<-function(u){
g<-crossprod(coeff,zeta(1:4)(u))
}
Obviously, f and g are equivalent, but in the actual code I am wri...
2015 Oct 06
19
[Bug 92306] New: GL Excess demo renders incorrectly on nv43
https://bugs.freedesktop.org/show_bug.cgi?id=92306
Bug ID: 92306
Summary: GL Excess demo renders incorrectly on nv43
Product: Mesa
Version: git
Hardware: x86 (IA32)
OS: Linux (All)
Status: NEW
Severity: normal
Priority: medium
Component: Drivers/DRI/nouveau
Assignee: nouveau
2013 May 02
0
How does dsgh do the standardization?
...how the generalized hyperbolic distribution is
standardized. One reference is the rugarch vignette, page 16-18:
http://cran.r-project.org/web/packages/rugarch/vignettes/Introduction_to_the_rugarch_package.pdf
I looked at the code of the dsgh function in the fBasics package:
> dsgh
function (x, zeta = 1, rho = 0, lambda = 1, log = FALSE)
{
if (length(zeta) == 3) {
lambda = zeta[3]
rho = zeta[2]
zeta = zeta[1]
}
param = .paramGH(zeta, rho, lambda)
ans = dgh(x, param[1], param[2], param[3], param[4], lambda,
log)
ans
}
<environment: namespac...
2007 Apr 18
3
Problems in programming a simple likelihood
...likelihood estimation, I
am trying to learn to program likelihoods in R. I started with a simple
probit model but am unable to get the code to work. Any help or
suggestions are most welcome. I give my code below:
************************************
mlogl <- function(mu, y, X) {
n <- nrow(X)
zeta <- X%*%mu
llik <- 0
for (i in 1:n) {
if (y[i]==1)
llik <- llik + log(pnorm(zeta[i,], mean=0, sd=1))
else
llik <- llik + log(1-pnorm(zeta[i,], mean=0, sd=1))
}
return(-llik)
}
women <- read.table("~/R/Examples/Women13.txt", header=TRUE) # DATA
# THE DA...
2007 Feb 07
6
setting a number of values to NA over a data.frame.
This is probably a simple problem but I don't see a
solution.
I have a data.frame with a number of columns where I
would like 0 <- NA
thus I have df1[,144:157] <- NA if df1[, 144: 157] ==0
and df1[, 190:198] <- NA if df1[, 190:198] ==0
but I cannot figure out a way do this.
cata <- c( 1,1,6,1,1,NA)
catb <- c( 1,2,3,4,5,6)
doga <- c(3,5,3,6,4, 0)
dogb <- c(2,4,6,8,10,
2010 Jul 22
1
, how to express bar(zeta) in main title in boxplot
Hi everyone, I am plotting a boxplot with main title as main =
bquote(paste(.(ts.ind[s]), ": ", bar(zeta), " Boxplot from 2001 to 2009", sep = "")) but it doesn't work. The program said they cannot find the function "bar". Does anyone know how to do it correctly? Thanks.
tin
[[alternative HTML version deleted]]
2009 Dec 10
2
Assigning variables into an environment.
...of parameters which change depending
on circumstances.
I thought that a sexy way of dealing with this would be to assign
the parameters as objects in the environment of the function in
question.
The following toy example gives a bit of the flavour of what I
am trying to do:
foo <- function(x,zeta) {
for(nm in names(zeta)) assign(nm,zeta[nm],envir=environment(bar))
bar(x)
}
bar <- function(x) {
alpha + beta*exp(gamma*x)
}
v <- c(alpha=2,beta=3,gamma=-4)
ls()
[1] "bar" "foo" "v"
foo(0.1,v)
alpha
4.01096
2+3*exp(-4*0.1)
[1] 4.01096 # Check; yes...
2004 Dec 09
3
surf.ls
Hello,
I am looking into description of surf.ls(spatial)
and see under value $beta - the coefficients.
When I use polynomial of degree 2 to fit surface
I expect to get 4 coefficients:
z = a_1 x^2 + a_2 xy + a_3 y^2 + a_4
What do beta really stand for and why do I get
$beta vector of length 6?
Thakns,
Mark
2007 Feb 08
1
Zeta and Zipf distribution
Dear R user,
I want to estimate the parameter of ZETA or/and ZIPF distributions
using R, given a series of integer values. Do you know a package
(similar to MASS) or a function (similar to fitdistr) I can use to
estimate the parameter of these distributions using MLE method?
Otherwise do you know a function (which use MLE method to estimate
distr...
2010 Jan 04
1
polygamma or Hurwitz zeta function
Hi,
Is there any R library that is capable of handling polygamma function
(Hurwitz zeta function also works)? I am aware of digamma(0 and trigamma(),
but could not find more advanced versions.
I'd appreciate any help.
Hakan Demirtas
2008 Mar 04
6
vector manipulations
Un texte encapsul? et encod? dans un jeu de caract?res inconnu a ?t? nettoy?...
Nom : non disponible
Url : https://stat.ethz.ch/pipermail/r-help/attachments/20080304/9de37092/attachment.pl
2003 Oct 11
1
boot statictic fn for dual estimation of 2 stats?
Hi,
I am trying to use boot() to refit an ordinal logit (polr in MASS) model.
(A very basic bootstrap which samples from the data frame without
replacement and updates the model.)
I need to extract two statistics per run (the coefficients and zeta) and I
tried concatenating them into a single vector after fitting, but I get the
following error:
Error in "[<-"(*tmp*, r, , value = statistic(data, i[r, ], ...)) :
number of items to replace is not a multiple of replacement length
This error goes away if I just return the coef...
2009 Jul 04
0
nv50/gallium: fix the zeta formats
...that's not yet defined in the pipe formats header,
and I actually don't know if it's even possbible to define
that cleanly the way pipe_format is laid out.
Christoph
-------------- next part --------------
An embedded and charset-unspecified text was scrubbed...
Name: 0001-nv50-correct-zeta-formats.patch
Url: http://lists.freedesktop.org/archives/nouveau/attachments/20090704/87c7d232/attachment.ksh
2017 Aug 18
1
A question about for loop
Dear R users,
I have the following codes:
zeta <- rep(1,8)
n <- 7
for (i in 1:2){
beta <- zeta[1:n+(i-1)*(n+1)]
print(beta)
parm <- zeta[i*(n+1)]
print(parm)
}
###################
The output is as follows:
[1] 1 1 1 1 1 1 1
[1] 1
[1] NA NA NA NA NA NA NA
[1] NA
#######################
The outcome I want to get is:
[1] 1 1 1 1 1 1 1...
2010 Nov 03
2
bugs and misfeatures in polr(MASS).... fixed!
...t's bad. There's no reason to suppose beta[pc+1L] is larger than
-100 or that the cumulative sum is smaller than 100. For practical
datasets those assumptions are frequently violated, causing the
optimization to fail. A work-around is to center the explanatory
variables. This helps keep the zetas small.
The correct approach is to use the values -Inf and Inf as the first
and last cut points. The functions plogis, dnorm, etc all behave
correctly when the input is one of these values. The dgumbel function
does not, returning NaN for -Inf. Correct this as follows
dgumbel <- function (x, l...
2010 Feb 24
2
Calling Data frame objects with spaces in their names
Hello I have the following data frame which I read from an EXCEL file, and
when i try to call one of its columns with a space in their names I am not
being able to. For example if I do EURODOLLAR$ED1.Comdty Date I obtain the
following error:
Error: inesperado símbolo en "EURODOLLAR$ED1.Comdty Date"
I have also tried using . or _ instead of the space and have obtained no
succes. How do I
2010 Apr 22
1
nv20tcl and renouveau questions
...case MESA_FORMAT_ARGB8888:
return 0x08;
case MESA_FORMAT_RGB565:
return 0x03;
case MESA_FORMAT_Z16:
return 0x10;
case MESA_FORMAT_Z24_S8:
return 0x20;
Does that mean that color only goes from bit 0 to 3, and zeta is bit 4-5.
Unlike nv30 where color goes from 0 to 4, and has zeta on 5-6 ?
On nv20, 0x10 and 0x20 is valid, but not 0x40.
And it seems nv20 dri also cause data errors because it does not
always set zeta with 0x10/0x20, it only does that in depth/stencil
case.
2.
TX_FILTER(0)
MIN NEAREST + MAG...
2004 Aug 06
2
preprocessor performance (was Re: Memory leak in denoiser + a few questions)
Jean-Marc Valin wrote:
>If you set the denoiser to "on" and the VAD to "off", what difference
>does it make in CPU time?
>
<p>Same program, running on Athlon XP 1700+:
Test 1, using VAD, but AGC, denoise off:
tevek@canarsie:~/work/hms/app_conference $ time ./vad_test
/tmp/demo-instruct.sw 5
reading from /tmp/demo-instruct.sw, repeating 5 times
read 537760
2009 Jun 17
2
Difference beetwen element in the same column
Hi, i have this file
pressure,k,eps,zeta,f,velocity:0,velocity:1,velocity:2,vtkValidPointMask,Point
Coordinates:0,Point Coordinates:1,Point Coordinates:2,vtkOriginalIndices
0.150545,0.000575811,0.0231277,0.000339049,-0.0193008,0.00318629,-6.24066e-07,5.39599e-05,^A,7,0,0,0
0.150546,0.000782719,0.0226157,0.000497957,-0.0192084,0.00367781,5...