search for: zi

Displaying 20 results from an estimated 201 matches for "zi".

Did you mean: zip
2012 Jul 03
2
EM algorithm to find MLE of coeff in mixed effects model
...# the main R script n=100 beta=c(-0.5,1) vvar=2 #sigma^2=2 psi=matrix(c(1,0.2,0.2,1),2,2) b.m.true=mvrnorm(n=n,mu=c(0,0),Sigma=psi) #100*2 matrix, each row is the b_i Xi=cbind(rnorm(7,mean=2,sd=0.5),log(2:8)) #Xi=cbind(rep(1,7),1:7) y.m=matrix(NA,nrow=n,ncol=nrow(Xi)) #100*7, each row is a y_i Zi=Xi b.list=as.list(data.frame(t(b.m.true))) psi.old=matrix(c(0.5,0.4,0.4,0.5),2,2) #starting psi, beta and var, not exactly the same as the true value beta.old=c(-0.3,0.7) var.old=1.7 gausspar=gauss.quad(10,kind="hermite",alpha=0,beta=0) data.list.wob=list() for (i in 1:n) { data.l...
2012 Jul 03
0
need help EM algorithm to find MLE of coeff in mixed effects model
...but sigma and psi are not close to the desired values. Is this due to the limitation of some methods that I used? Can any one give some help? I am stuck for a week. I can send the code to you. First time to raise a question here. Not sure if it is proper to post all code. Below is the same as the zip file. ########################################################################## # the main R script n=100 beta=c(-0.5,1) vvar=2 #sigma^2=2 psi=matrix(c(1,0.2,0.2,1),2,2) b.m.true=mvrnorm(n=n,mu=c(0,0),Sigma=psi) #100*2 matrix, each row is the b_i Xi=cbind(rnorm(7,mean=2,sd=0.5),log(2:8)) #Xi=c...
2004 Jun 29
1
abline and its objects
...bm2 ibm 2004-01-02 91.55 2004-01-05 93.05 2004-01-06 93.06 2004-01-07 92.78 2004-01-08 93.04 2004-01-09 91.21 2004-01-12 91.55 2004-01-13 89.70 2004-01-14 90.31 2004-01-15 94.02 . . . I plot the data. No Problem. Now I extract the first day of the month in this fashion. >zi <- extractIts(ibm2,weekday=T,find="first",period="month") >zi ibm 2004-01-02 91.55 2004-02-02 99.39 2004-03-01 97.04 2004-04-01 92.37 2004-05-03 88.02 > Still ok. I would like to put a vertical line at each of the zi values. >abline(v=zi,type="h&q...
2019 Mar 05
0
Weird problem / bug with augPred() from nlme
...(nlme_3.1-137). Here is a reproducible example to illustrate the issue (tested on R 3.5.2 and R-devel 2019-03-03 r76192): library(nlme) dat <- data.frame(id = c(1,1,1,2,3,3,4,4,4,4), xi = c(1,2,3,1,1,2,1,2,3,4), yi = c(2,1,4,2,3,2,5,4,6,8), zi = c(rep("a",9), NA)) res1 <- lme(yi ~ xi, random = ~ 1 | id, data=dat) sav1 <- augPred(res1, primary = ~ xi) # WORKS dat$zi <- "a" res2 <- lme(yi ~ xi, random = ~ 1 | id, data=dat) sav2 <- augPred(res2, primary = ~ xi) # WORKS dat$zi[10] <- NA res3 <- l...
2009 May 21
0
VC2010 (VC10) can't use /Zi option
wine is 1.1.21 I use VC10 beta1 compiler on window, and it's work fine. The Windows is pure: not install any software. That mean is: The VC 10 is a portable software. I can compile main.cpp use: ./cl.exe /EHsc main.cpp it's OK! the main.exe created! but if i do: ./cl.exe /EHsc /Zi main.cpp it's fair. the error information is: > loaden at qpsoft:~/qpcb/bin$ ./cl.exe /EHsc /Zi main.cpp > fixme:heap:HeapSetInformation 0x540000 0 0x32fd88 4 > fixme:heap:HeapSetInformation (nil) 1 (nil) 0 > Microsoft (R) 32-bit C/C++ Optimizing Compiler Version 16.00.20506.01 f...
2006 Aug 22
4
Native Extensions on Windows 0.10 series
...77 Copyright (C) Microsoft Corporation. Alle Rechte vorbehalten. ruby extconf.rb update ferret creating Makefile nmake e:\programme\ruby\bin\ruby -e "puts ''EXPORTS'', ''Init_ferret_ext''" > fer ret_ext-i386-mswin32.def cl -nologo -MD -Zi -O2b2xg- -G6 -I. -Ie:/programme/ruby/lib/ruby/1.8/i38 6-mswin32 -Ie:/programme/ruby/lib/ruby/1.8/i386-mswin32 -I. -c -Tcanalysis.c analysis.c e:\Programme\ruby\lib\ruby\gems\1.8\gems\ferret-0.10.0\ext\defines.h(4) : fatal error C1083: Include-Datei kann nicht ge?ffnet werden: ''sys/types.h&...
2010 Sep 21
2
Need help for EM algorithm ASAP !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
...y(ghyp) ############ simulation part simulation<-function(n,lambda,mu,thelda,gamma,sigma,beta){ set.seed(235) chi<-thelda^2 psi<-gamma^2 W <- rGIG(n, lambda, chi, psi); Z <- rnorm(n,0,1); y<-mu + beta * W + sqrt(W) * Z *gamma; for (i in 1:n){ theldastar<-rep(0,n) zi<-rep(0,n) ti<-rep(0,n) muthelda<-mu gammathelda<-thelda*gamma sigmathelda<-(thelda^2)*sigma betathelda<-(thelda^2)*sigma*beta lambdastar<-lambda-0.5 theldastar[i]<-sqrt(1+((y[i]-muthelda)/sigmathelda)^2) gammastar<-sqrt((gammathelda^2)+((betathelda/sigmathelda)^2))...
2009 Jun 24
0
[LLVMdev] New HLVM examples
...written in only 228 lines of code that can execute interesting programs:   http://ocamlnews.blogspot.com/2009/06/compiler-development-part-1.html For example, the compiler described in the article can execute the following OCaml-like program to print the Mandelbrot set: # let rec pixel((n, zr, zi, cr, ci) : int * float * float * float * float) : unit =     if n = 65536 then print_char ' ' else       if zr * zr + zi * zi >= 4.0 then print_char '.' else         pixel(n+1, zr * zr - zi * zi + cr, 2.0 * zr * zi + ci, cr, ci);; # let rec row((i, j, n) : int * int * int) : unit...
2010 Dec 10
0
locfit weights not working as expected
...hat the weights option is doing since it is clearly not doing what I expected it to. I would gratefully appreciate any advice or help that anyone can give on this issue and I appreciate your time very much. library(MASS) library(splines) library(sm) library(quantreg) library(locfit) set.seed(20) Zi = rnorm(5000,0, 2) ei = mvrnorm(5000, c(.6,2), matrix(c(.7,0,0,.9),2,2)) X1i = exp(-.5*Zi + ei[,1]) X2i = exp(-.5*(Zi*log(T1i) -log(T1i) + Zi) + ei[,2]) X1i = log(X1i) boot.weight = rmultinom(1,5000, prob=rep(1/5000, 5000)) boot.subset = rep(1:5000, boot.weight) loc.model.1 = locfit(1*(X2i[boot.s...
2019 Mar 24
3
call an existing IPO pass
...lvm/IR/PassManager.h". I am not quite sure how to invoke these passes in my own pass. I used "UnifyFunctionExitNodes" in my pass and this one worked fine. It will be a great help if anyone can point out how to call the "CalledValuePropagationPass" in my own pass. Thanks, Zi -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://lists.llvm.org/pipermail/llvm-dev/attachments/20190324/93d90de4/attachment.html>
2011 Oct 19
1
help with glmmADMB ZI; function maximizer failed
...m missing something, so any help would be most appreciated. Apologies for the long message! Many thanks, Emma Rosenfeld PhD student, School of Geography, Earth and Environmental Sciences, University of Birmingham -- View this message in context: http://r.789695.n4.nabble.com/help-with-glmmADMB-ZI-function-maximizer-failed-tp3918994p3918994.html Sent from the R help mailing list archive at Nabble.com.
2020 Jun 22
2
[PATCH 13/16] mm: support THP migration to device private memory
On Mon, Jun 22, 2020 at 3:30 PM Yang Shi <shy828301 at gmail.com> wrote: > > On Mon, Jun 22, 2020 at 2:53 PM Zi Yan <ziy at nvidia.com> wrote: > > > > On 22 Jun 2020, at 17:31, Ralph Campbell wrote: > > > > > On 6/22/20 1:10 PM, Zi Yan wrote: > > >> On 22 Jun 2020, at 15:36, Ralph Campbell wrote: > > >> > > >>> On 6/21/20 4:20 PM, Zi Yan...
2023 Mar 20
0
[RFC PATCH v1 3/3] test/vsock: skbuff merging test
...char *buf; ... buf = "HELLO"; res = send(fd, buf, strlen(buf), 0); ... >+ res = send(fd, "HELLO", strlen("HELLO"), 0); >+ if (res != strlen("HELLO")) { >+ fprintf(stderr, "unexpected send(2) result %zi\n", res); >+ exit(EXIT_FAILURE); >+ } >+ >+ control_writeln("SEND0"); >+ /* Peer reads part of first packet. */ >+ control_expectln("REPLY0"); >+ >+ /* Send second skbuff, it will be merged. */ >+ res = send(fd, "WORLD", strlen("WO...
2020 Jun 22
2
[PATCH 13/16] mm: support THP migration to device private memory
On Mon, Jun 22, 2020 at 4:02 PM John Hubbard <jhubbard at nvidia.com> wrote: > > On 2020-06-22 15:33, Yang Shi wrote: > > On Mon, Jun 22, 2020 at 3:30 PM Yang Shi <shy828301 at gmail.com> wrote: > >> On Mon, Jun 22, 2020 at 2:53 PM Zi Yan <ziy at nvidia.com> wrote: > >>> On 22 Jun 2020, at 17:31, Ralph Campbell wrote: > >>>> On 6/22/20 1:10 PM, Zi Yan wrote: > >>>>> On 22 Jun 2020, at 15:36, Ralph Campbell wrote: > >>>>>> On 6/21/20 4:20 PM, Zi Yan wrote: &g...
2019 Feb 27
3
Making LLD PDB generation faster
...t types are duplicates. If there is a class Foo in a header file, and you include that header file in 100 different translation units, all 100 of them of them will get full type information for that class in its object file. This is the /Z7 semantics that clang-cl implements. The alternative is /Zi which uses a type server (out of process de-duplicater) to do this merging at compile time, which is what cl uses by default, and which clang-cl doesn't support. -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://lists.llvm.org/pipermail/llvm-dev/attachme...
2012 Jul 02
0
Fit circle with R
...ted circle # [,3] = radius of fitted cirlce CircleFitByPratt <- function(x,y){ n <- length(x) centroid <- cbind(mean(x),mean(y)) Mxx=0; Myy=0; Mxy=0; Mxz=0; Myz=0; Mzz=0; for(i in 1:n){ Xi <- x[[i]] - centroid[1] Yi <- y[[i]] - centroid[2] Zi <- (Xi*Xi) + (Yi*Yi) Mxy = Mxy + Xi*Yi; Mxx = Mxx + Xi*Xi; Myy = Myy + Yi*Yi; Mxz = Mxz + Xi*Zi; Myz = Myz + Yi*Zi; Mzz = Mzz + Zi*Zi; } Mxx = Mxx/n Myy = Myy/n Mxy = Mxy/n Mxz = Mxz/n Myz = Myz/n Mzz = Mzz/n # com...
2020 Jun 22
2
[PATCH 13/16] mm: support THP migration to device private memory
On 22 Jun 2020, at 17:31, Ralph Campbell wrote: > On 6/22/20 1:10 PM, Zi Yan wrote: >> On 22 Jun 2020, at 15:36, Ralph Campbell wrote: >> >>> On 6/21/20 4:20 PM, Zi Yan wrote: >>>> On 19 Jun 2020, at 17:56, Ralph Campbell wrote: >>>> >>>>> Support transparent huge page migration to ZONE_DEVICE private memory. &...
2001 Nov 06
1
incorrect xlim error message in image() (PR#1160)
...63229,0.03587444,0.03811659,0.04035874,0.04932735,0.05156951,0.05381166) y <- 1 z <- c(0,0.067,NA,0.167,0.083,0.05,0.067,NA,0,0.1,0,0.05,0.067,0.067,0.016,0.117,0.01 7,-0.017,0.2,0.35,0.134,0.15) z_matrix(z, length(z),1) image(x2, y, z) Error in image(as.double(x), as.double(y), as.integer(zi), col) : invalid x / y values or limits image(x2[1:20], y, as.matrix(z[1:20,])) "OK" image(x1, y, z) Error in image(as.double(x), as.double(y), as.integer(zi), col) : invalid x / y values or limits image(x1[1:20], y, as.matrix(z[1:20,])) Error in image(as.double(x), as...
2011 Nov 23
1
Measure of separation for survival data
.... Although there is no R code for this, the author informs me that it should be easy: 1. Calculate the linear predictor xb from the proportional hazards model or other model of interest. 2. Calculate the ranks r1,...,rn of xb. In case of ties, do not average the ranks. 3. Calculate scaled rankits zi = sqrt(_pi/8) * invnormal((ri - 3/8)/(n +1/4)) where invnormal() is the inverse normal distribution function, and where n is the sample size and _pi = 3.141592654 ... 4. In case of ties in the original xb, substitute average zi's over each of the tied sets. 5. Perform regression (e.g. Cox) on z...
2014 Sep 15
2
[LLVMdev] codeview debug info in Visual Studio
Hi, Is there any way to debug the codeview output of llvm from within Visual Studio? I want to use the codeview line info debug output of clang/llvm. I tried with the x86_64-pc-windows-msvc and i686-pc-windows-msvc triples and linking it into an existing project with VC++ from within the IDE and outside with link /debug. Neither option lets me debug with Visual Studio as debugger host.