search for: bstart

Displaying 12 results from an estimated 12 matches for "bstart".

Did you mean: start
2009 Jul 01
0
probit with sample selection error?
...Codes: require(mvtnorm) obs=1000 sig=matrix(c(1,0.7,0.7,1),2,2) mu=c(0,0) e = rmvnorm(obs,mu,sig); x1 = rnorm(obs);x2=rnorm(obs);x3=rnorm(obs); y1 = as.integer(1+2*x1-2*x2+e[,1]>0) y2 = as.integer(0.2-2*x2+x3+e[,2]>0) x1 = cbind(1,x1,x2); x2 = cbind(1,x2,x3) iprobit<-function(y,x){ bstart = solve(qr(x),y) b=optim(bstart,probll,y=y,x=x,hessian=F)$par return(b) } probll<-function(bstart,y,x){ prob=pnorm(x%*%bstart); ll= -sum(y*log(prob)+(1-y)*log(1-prob)); return(ll) } heckprob<-function(y1,x1,y2,x2){ bstart = as.vector(c(iprobit(y1,x1),iprobit(y2,x2),0.5)) b=optim(bstart,heck...
2014 Jul 08
3
Paquete generado no detectan ambiente particular creado.
...zip del paquete y cargado desde la RGui, no me detecta la existencia del environment que creé (.Ch.env). Es como si ahora el pkt sólo pudiera estar integrado (a efectos prácticos) por funciones, sin admitir la existencia de una estructura de datos subyacente, como es el conjunto formado por lGlo y bStarted, ambas incluidas en el environment creado (.Ch.env) .Ch.env <- new.env() .Ch.env$lGlo <- list() .Ch.env$bStarted <- FALSE CheckGloCreated <- function() {   if (.Ch.env$bStarted == TRUE) {     stop("Data structures were already initialized.", call.=FALSE)    } } ChrL.Start...
2014 Jul 09
3
Resumen de R-help-es, Vol 65, Envío 13
...zip del paquete y cargado desde la RGui, no me detecta la existencia del environment que creé (.Ch.env). Es como si ahora el pkt sólo pudiera estar integrado (a efectos prácticos) por funciones, sin admitir la existencia de una estructura de datos subyacente, como es el conjunto formado por lGlo y bStarted, ambas incluidas en el environment creado (.Ch.env) .Ch.env <- new.env() .Ch.env$lGlo <- list() .Ch.env$bStarted <- FALSE CheckGloCreated <- function() { if (.Ch.env$bStarted == TRUE) { stop("Data structures were already initialized.", call.=FALSE) } } ChrL.Start &...
2004 Sep 15
2
efficient submatrix extraction
...Now I'm also doing this subdivision into 4x4, 8x8 ... 256x256 submatrices. Currently I'm using loops and I'm sure there is a mroe efficient way to do it: m <- matrix(runif(1024*1024), nrow=1024) boxsize <- 2^(1:8) for (b in boxsize) { bcount <- 0 bstart <- seq(1,1024, by=b) for (x in bstart) { for (y in bstart) { xend <- x + b - 1 yend <- y + b - 1 if (length(which( m[ x:xend, y:yend ] > 0.7)) > 0) { bcount <- bcount + 1 }...
2014 Jul 08
2
Paquete generado no detectan ambiente particular creado.
...---- De: r-help-es-bounces en r-project.org [mailto:r-help-es-bounces en r-project.org] En nombre de Eva Prieto Castro Enviado el: martes, 08 de julio de 2014 13:46 Para: r-help-es Asunto: Re: [R-es] Paquete generado no detectan ambiente particular creado. Resuelto!! Retiré esta línea: .ChrL.env$bStarted <- FALSE Se ve que el proceso de paquetización no admite asignaciones; o mejor dicho, bloquea los objetos si además de establecer su tipo se realiza una asignación de valor. Tengo que extender el ajuste a todo el proyecto, pero -en principio- parece estar resuelta la cuestión; o mejor dich...
2014 Jul 07
2
Consulta paquetización con versión R 3.1.0
Hi everybody I have a very big problem: With R 3.0.2 I could construct the package for this code: if (exists('.ChrL.env') == TRUE) {   rm(.ChrL.env) } .ChrL.env <- new.env() .ChrL.env$lGlo <- list() .ChrL.env$bStarted <- FALSE CheckGloCreated <- function() {   if (.ChrL.env$bStarted == TRUE) {     stop("Data structures were already initialized.", call.=FALSE)    } } ChrL.Start <- function() {    CheckGloCreated()     cat("Libraries have been loaded and data structure has been initi...
2014 Jul 07
2
Consulta paquetización con versión R 3.1.0
Hi everybody I have a very big problem: With R 3.0.2 I could construct the package for this code: if (exists('.ChrL.env') == TRUE) {   rm(.ChrL.env) } .ChrL.env <- new.env() .ChrL.env$lGlo <- list() .ChrL.env$bStarted <- FALSE CheckGloCreated <- function() {   if (.ChrL.env$bStarted == TRUE) {     stop("Data structures were already initialized.", call.=FALSE)    } } ChrL.Start <- function() {    CheckGloCreated()     cat("Libraries have been loaded and data structure has been initi...
2011 Dec 19
1
None-linear equality constrained optimisation problems
Dear R users, I have a problem. I would like to solve the following: I have pL = 1/(1+e^(-b0+b1)) pM = 1/(1+e^(-b0)) pH = 1/(1+e^(-b0-b1)) My target function is TF= mean(pL,pM,pH) which must equal 0.5% My non-linear constraint is nl.Const = 1-(pM/pH), which must equal 20%, and would like the values of both b0 and b1 where these conditions are met. I have searched widely for an answer,
2014 Jul 08
0
Re: [R-es] Consulta paquetización con versión R 3.1.0
...valuable help to this list. Br. Frede Sendt fra Samsung mobil -------- Oprindelig meddelelse -------- Fra: Eva Prieto Castro Dato:08/07/2014 18.39 (GMT+01:00) Til: Duncan Murdoch Cc: r-help Emne: Re: [R] [R-es] Consulta paquetización con versión R 3.1.0 Solved!! I removed this line: .ChrL.env$bStarted <- FALSE And run ok!! I supose the method let the fact of initializing data structure, but not the fact of assign. The basic example runs ok. Now I have to test all the project. Thanks!! Eva 2014-07-08 13:02 GMT+02:00 Eva Prieto Castro <eva.pcastro.lind@gmail.com>: > Duncan,...
2008 Feb 07
0
nxMyFLA.dll interacts badly with Nero
...ing badly with a piece of nxMyFLA.dll software (nxMyFLA.dll 1.0.0.33) and causing crash reports (Average Hits per day 15, Operating System 97% Windows Vista) on our Windows Error Reporting company page. Call stack is: ... nxMyFLA+0x3e55 AudioPluginMgr+0x602b nero!CPlugAudioItem::InternalOpen(bool bStart = <Memory access error>)+0xbb [d:\dailybuild\sources\nero8_chili3_release\nero\nero\plugaudioitem.cpp @ 1842] nero!CPlugAudioItem::Preconstruct(int fPauseFlag = 1)+0x156 [d:\dailybuild\sources\nero8_chili3_release\nero\nero\plugaudioitem.cpp @ 101] nero!CPlugAudioItem::SetFilePath(wchar_t * s...
2010 Apr 21
12
Using AR.connection.execute(sql) -- messing with my string?
...e near ''DELIMITER $$ ==== FWIW, I''ve pawed over the sources and see that mysql_adapter''s execute() calls @connection(query), but I lose the thread after that. Here''s the function (some lines elided for brevity): ==== sql = <<SQL -- COVERAGE(astart, aend, bstart, bend) -- DELIMITER $$ DROP FUNCTION IF EXISTS `coverage`$$ CREATE FUNCTION `coverage`(abeg DATETIME, aend DATETIME, bbeg DATETIME, bend DATETIME) RETURNS FLOAT DETERMINISTIC BEGIN <snip> END; $$ DELIMITER ; SQL ActiveRecord::Base.establish_connection ActiveRecord::Base.connection.exe...
2008 Dec 22
17
[PATCH 0 of 9] swiotlb: use phys_addr_t for pages
Hi all, Here''s a work in progress series whcih does a partial revert of the previous swiotlb changes, and does a partial replacement with Becky Bruce''s series. The most important difference is Becky''s use of phys_addr_t rather than page+offset to represent arbitrary pages. This turns out to be simpler. I didn''t replicate the map_single_page changes, since