Displaying 10 results from an estimated 10 matches for "psi2".
Did you mean:
psi
2003 Dec 18
1
NUMERIC DERIVATE
UseRs,
I used the optim function
valor.optim <- optim(c(1,1,1),logexp1,method
="BFGS",control=list(fnscale=-1),hessian=T);
and I want to calculate the derivates,
psi1<-valor.optim$par[1]
psi2<-valor.optim$par[2]
psi3<-valor.optim$par[3]
a0=exp(psi1);
a1=exp(psi2)/(20+exp(psi2)+exp(psi3));
a2=exp(psi3)/(20+exp(psi2)+exp(psi3))
deriv.psi1<-numericDeriv(a0,c("psi1","psi2","psi3"));
deriv.psi2<-numericDeriv(a1,c(...
2012 Oct 23
1
Minimizing Computational Time
...--------------------------
dose<-seq(0,10,.5)
alpha1<--4
beta1<-0.5
alpha2<--6
beta2<--.7
psi1<-function(alpha1,beta1,alpha2,beta2,d){
z1<-exp(alpha1+beta1*d)
z2<-exp(alpha2+beta2*d)
z1/((1+z1)*(1+z2))
}
psi2<-function(alpha2,beta2,d) {
z2<-exp(alpha2+beta2*d)
z2/(1+z2)
}
psi1.hat=c()
psi2.hat=c()
for (i in 1:length(dose)){ # just want to avoid this 'for' loop
d<-dose[i]
psi1.hat[i]<-psi1(alpha1,beta1,alpha2,beta2,d)
psi2.hat[i]<...
2006 Jan 18
1
Breakpoints for multiple variables using Segmented
Hi all,
I am using the package ?Segmented? to estimate logistic regression models
with unknown breakpoints (see Muggeo 2003 Statistics in Medicine
22:3055-3071). In the documentation it suggests that it might be possible to
include several variables with breakpoints in the same model: ?Z = a vector
or a matrix meaning the (continuous) explanatory variable(s) having
segmented relationships with
2007 Jun 27
1
SEM model fit
...ex -> enf, a2, 0.2
oftdrnkr -> enf, a3, 0.2
attn -> nvatt, NA, 1
attn -> crimatt, lam4, 1.3
attn -> asltatt, lam5, 1.2
attn <-> attn, psi2, 0.5
nvatt <-> nvatt, theta4, 0.5
crimatt <-> crimatt, theta5, 0.1
asltatt <-> asltatt, theta6, 0.2
gender -> attn, a4, 0.2
acon -> acon1, NA, 1
acon...
2014 Jan 30
4
Cannot Join Samba 4.1 to an existing Windows 2008 domain as a Backup DC
...just fine. So I don't think it has to do with ACLs but I have no idea.
I'm also getting LDB errors but I have no idea how to fix them.
[root at files ~]# samba-tool domain join MYDOMAIN DC -Uadministrator --realm=MYDOMAIN.COM
Finding a writeable DC for domain 'MYDOMAIN'
Found DC PSI2.mydomain.com
Password for [MYDOMAIN\administrator]:
workgroup is MYDOMAIN
realm is mydomain.com
checking sAMAccountName
Adding CN=FILES,OU=Domain Controllers,DC=mydomain,DC=com
Adding CN=FILES,CN=Servers,CN=Default-First-Site-Name,CN=Sites,CN=Configuration,DC=mydomain,DC=com
Adding CN=NTDS Settings...
2013 Jul 22
1
Error with sem function df = -6
...my model?
Thank you.
Here is the code:
model.ram1 <- specifyModel()
UNIT -> Y1, ty,0.3
UNIT -> Z1, tz1,-0.1
UNIT -> Z2, tz2,0.1
CF -> Y1, lamy,0.5
CF -> Z1, lamz1,0.85
CF -> Z2, lamz2,0.2
UNIT -> CF, k
Y1 <-> Y1, psi3, NA
Z1 <-> Z1, psi1, NA
Z2 <-> Z2, psi2, NA
CF <-> CF,vCF1,NA
sem.m1<-sem(model=model.ram1,S=S2,N=500,fixed.x="UNIT",raw=T)
--
I.J. Williams
Ph.D. Student in Education Measurement and Statistics
Statistics MS
Mathematics BS
Rutgers University
[[alternative HTML version deleted]]
2013 Jan 11
1
problems with package 'segmented'
...lm <- lm(y~0+ group + time.KV + time.KW + time.WC)
os <- segmented(olm, seg.Z= ~ time.KV + time.KW + time.WC,
psi=list(time.KV=c(300,500), time.KW=c(450,600), time.WC=c(300,450)))
The error message is as follows:
Error in `rownames<-`(`*tmp*`, value = c("psi1.time.KV", "psi2.time.KV", :
Length of 'dimnames' [1] not equal to array extent
Zusätzlich:Warnmeldung:
In cbind(initial, psi, sqrt(vv)) :
number of rows of result is not a multiple of vector length (arg 2)
However, when I take out one break.point from any of the groups (e.g.
time.KV=300), t...
2012 Nov 16
1
Interpretation of davies.test() in segmented package
...ss
segments <- segmented(lmfit, seg.Z=~HRRPUA_kWm2,psi=c(475,550))
summary(segments)
***Regression Model with Segmented Relationship(s)***
Call:
segmented.glm(obj = lmfit, seg.Z = ~HRRPUA_kWm2, psi = c(475,
550))
Estimated Break-Point(s):
Est. St.Err
psi1.HRRP 430.2 4.087
psi2.HRRP 484.6 3.077
t value for the gap-variable(s) V: 0 0
Meaningful coefficients of the linear terms:
Estimate Std. Error t value Pr(>|t|)
(Intercept) -38.6993 274.7666 -0.141 0.8891
HRRPUA_kWm2 1.4297 0.7472 1.914 0.0668 .
U1.HRRP 42.2884 4.7696 8.866...
2006 Aug 22
1
Total (un)standardized effects in SEM?
Hi there,
as a student sociology, I'm starting to learn about SEM. The course I
follow is based on LISREL, but I want to use the SEM-package on R
parallel to it.
Using LISREL, I found it to be very usable to be able to see the
total direct and total indirect effects (standardized and
unstandardized) in the output. Can I create these effects using R? I
know how to calculate them
2001 Nov 25
2
another optimization question
Dear R list members,
Since today seems to be the day for optimization questions, I have one that
has been puzzling me:
I've been doing some work on sem, my structural-equation modelling package.
The models that the sem function in this package fits are essentially
parametrizations of the multinormal distribution. The function uses optim
and nlm sequentially to maximize a multinormal