similar to: Optimization problem with nonlinear constraint

Displaying 20 results from an estimated 600 matches similar to: "Optimization problem with nonlinear constraint"

2010 Jan 15
1
Replacing NAs with 0 for variables with the same ending
Dear all, I'm looking for a way to replace NA's with 0 for a number of variables which share the same ending and which constitute a subset of a data frame. Say, for example, there is > data <- data.frame(ax=c(1,2,3,NA,0) , bx=c(3,5,NA,5,1) , ay=c(5,NA,2,NA,0) , by=c(4,2,NA,2,1)) > data ax bx ay by 1 1 3 5 4 2 2 5 NA 2 3 3 NA 2 NA 4 NA 5 NA 2 5 0 1 0 1 I wish
2009 Nov 02
1
for parameter 'keep' in 'step'
Hello Lady or Sir, I want to do model selection with 'step' function. But there is a trouble to me. For example, there are 5 independent variables, X0,X1,X2,X3 and X4; and 1 dependent variable y. I want to run stepwise regression y ~ X0 + X1 + X2 + X3 + X4, and I want to keep X0 always in the model. Every time when I run command 'step' with 'keep', error information
2008 Apr 25
2
Extracting coefficients' standard errors from linear model
Dear all, Hope this question is not too trivial... In order to correct standard errors from an estimation of a fixed effects regression model y need to extract the vector of standard errors of the coefficients of a simple linear model estimated using lm(var1~var2+var3+var4) Unfortunately I can't find out the corresponding function. Thank you very much for your help. Uli -- Uli
2012 Nov 28
2
output data by date?
Dear Helpers, I have a dataset X, with no missing values, everything is in order, R reads it correctly, and I have already done some statistical analyses on the dataset. The data are in order by date (six sampling dates in one year, earliest to latest) and I now want to generate boxplots for each parameter for each date. However, R outputs the boxplots in some order that I do not understand (eg.
2008 Mar 17
3
Creating plots for all variables in a data frame and printing them with the variable name in the main title
Dear all, I'm just trying to create plots for all variables in a dataframe (named "x") using the following: png() apply(x,2,hist) Just as intended, it produces one plot for each variable. Unfortunately, the main title of each graph is "Histogram of newX[,i]" instead of "Histogram of name of variable". This makes it impossible to assign the graphs to the
2011 Jul 08
1
need help with metadata plugin
Hello, I've downloaded the metadata plugin from http://hg.intevation.org/kolab/dovecot-metadata-plugin compiled it without errors, made the entries as described in README in dovecot.conf. Only ANNOTATEMORE or anything else additional doesn't show up in the capabilties. Is there anything wrong with my configuration? What I see is: telnet localhost 143 Trying 127.0.0.1... Connected to
2011 Feb 04
0
R package hypred: Simulation of genomic data in applied genetics
Dear useRs, I am glad to announce that the new R package "hypred", initial version 0.1, is now available on CRAN. "hypred" is a package for simulating high-density SNP data. Its main function, "hypredRecombine" is intended to be used as a "Software tool" in larger programs that simulate complex populations. The focus of the package is on producing
2011 Feb 04
0
R package hypred: Simulation of genomic data in applied genetics
Dear useRs, I am glad to announce that the new R package "hypred", initial version 0.1, is now available on CRAN. "hypred" is a package for simulating high-density SNP data. Its main function, "hypredRecombine" is intended to be used as a "Software tool" in larger programs that simulate complex populations. The focus of the package is on producing
2007 Apr 18
2
[Bridge] aoe/vblade on "localhost"
hello ! i try to use a network technology on one single host, which wasn`t designed for that. to give a short overview of what i`m talking about: AoE is just like a "networked blockdevice" (just like nbd/enbd) - but without tcp/ip. AoE kernel driver is the "client end" (see this like an iSCSI initiator) - and an etherblade storage appliance is the "server end"
2008 Mar 18
1
Error when producing multiple graphes
Dear all, Within a larger script I use the following code to produce barplots for all variables contained in a dataframe "type3m": for(xn in names(type3m)) barplot(table(type3m[[xn]]), main = paste ("Barplot of", xn), width=0.75,legend.text=barnamesm, xlim=c(0,4),ylim=c(0,400)) The plots are produced and printed into a *.ps file. However, R gives an error
2009 Jul 03
1
Error
Dear Sir, I installed successfully using the install.packages("Rdonlp2", repos=" http://R-Forge.R-project.org"). I tried on the example which is defined on the Rdonlp help file ,p <- c(-10,10)par.l <- c(0,0); par.u <- c(100,100)lin.u <- 1; lin.l <- 1A <- t(c(1,1))fn <- function(x){ x[1]^2+x[2]^2}ret <- donlp2(p, fn, par.lower=par.l, par.upper=par.u, A=A,
2015 Jun 11
1
how to doveadm search from "<>" (null sender)?
Hi, I tried to search for mailer daemon messages but can't find a syntax for the null sender. all these does not work: doveadm -u xxx from "<>" doveadm -u xxx from <> doveadm -u xxx from "" any ideas? Thank you Daniel
2009 Aug 06
0
donlp2
Dear Sir, I am working with one example in R donlp2. How I can get the Hessian matrix from the output. p = c(10,10) par.l = c(-100,-100) par.u = c(100,100) nlin.l = nlin.u = 2 fn = function(x) { x[1]^2+x[2]^2 } dfn = function(x){ c(2*x[1], 2*x[2]) } attr(fn, "gr") = dfn nlcon = function(x){ x[1]*x[2] } dnlcon = function(x){ c(x[2], x[1]) } attr(nlcon, "gr") = dnlcon
2012 Jul 18
4
The best solver for non-smooth functions?
# Hi all, # consider the following code (please, run it: # it's fully working and requires just few minutes # to finish): require(CreditMetrics) require(clusterGeneration) install.packages("Rdonlp2", repos= c("http://R-Forge.R-project.org", getOption("repos"))) install.packages("Rsolnp2", repos= c("http://R-Forge.R-project.org",
2012 Oct 09
2
Error in matrix (unlist(value, recursive = FALSE, use.names = FALSE), nrow = nr, : attempt to set an attribute on NULL
I am using Donlp2 package to solve a non-linear problem, but there's an error I always meet: Error in matrix(unlist(value, recursive = FALSE, use.names = FALSE), nrow = nr, : attempt to set an attribute on NULL I have been suffering from this bug for a long time. I'll be very grateful if somebody could help me -_- -- View this message in context:
2008 Jul 25
3
Maximization under constraits
I''m looking for a R function which can maximise this logliklihood function, under the constraits a>0 e b>0 f<-function(param){ a<-param[1] b <-param[2] log(prod)-(a*s2)-(b*s)-n*log(1-((0.5*b/sqrt(a))*(exp((b^2)/(4*a)))*((sqrt(pi ))*(1-pnorm(-b/(2*sqrt(a)), mean=0, sd=1)))))} I''ve tried maxlik constrOptim e donlp2 but without success. Thanks so
2009 Jul 03
2
Error using the Rdonlp2‏ Package
Dear experts, I'm attempting to solve a constrained optimization problem using the Rdonlp2 package. I created a Lagrange function (L=f(x)-lambda(g(x)-c)), where x is a vector of 16 parameters. This is what I'm using as objective function in the code below. In addition, I set bounds on these parameters (par.u and par.l). When I run the code, I get the error message shown below. Any idea
2018 Jul 24
2
SRV records not added by subsequent DC's
On Tue, 24 Jul 2018 14:15:04 +0100 Rowland Penny via samba <samba at lists.samba.org> wrote: > On Tue, 24 Jul 2018 15:00:27 +0200 > > dc1 and dc2 have created SRV DNS records: > > > > # host -t SRV _ldap._tcp.dc._msdcs.iww.lan > > _ldap._tcp.dc._msdcs.iww.lan has SRV record 0 100 389 dc1.iww.lan. > > _ldap._tcp.dc._msdcs.iww.lan has SRV record 0 100 389
2009 Aug 27
19
Best R text editors?
Quick informal poll: what is everyone's favorite text editor for working with R? I'd like to hear from people who are using editors that have some level of direct R interface (e.g. Tinn-R, Komodo+SciViews). Thanks! --j -- Jonathan A. Greenberg, PhD Postdoctoral Scholar Center for Spatial Technologies and Remote Sensing (CSTARS) University of California, Davis One Shields Avenue The
2008 Aug 19
1
nonlinear constrained optimization
Hi. I need some advises on how to use R to find pi (i is the index) with the following objective function and constraint: max (sum i)[ f(ai, bi, pi) * g(ci, di, pi) * Di ] s.t. (sum i)[ f(ai, bi, pi) * Di * pi] / (sum i)[ f(ai, bi, pi) * Di ] <= constant f and g are diffentiable. So, I am thinking of optim with method = "BFGS"? But wonder how to include the