Displaying 20 results from an estimated 109 matches for "x_1".
Did you mean:
x11
2006 Jun 08
1
panel.abline and xyplot
Dear All,
I am wondering on how to use the abline.xyplot with xyplot such that I will have different vertical lines for each panel. More sepcifically, suppose that the xyplot generates 4 panels defined by the combination of two binary variables: X_1 and X_2. i.e.
xyplot(Y ~ Z | X_1*X_2, data = df)
I want something like:
abline(v = 5) if X_1=0 and X_2 = 0
abline(v = 10) if X_1=0 and X_2 = 1
abline(v = 15) if X_1=1 and X_2 = 0
abline(v = 31) if X_1=1 and X_2 = 1
when I used : xyplot(Y ~ Z | X_1*X_2, data=df, p...
2004 May 21
2
Help with Plotting Function
Dear List:
I cannot seem to find a way to plot my data correctly. I have a small data frame with 6 total variables (x_1 ... x_6).
I am trying to plot x_1 against x_2 and x_3.
I have tried
plot(x_2, x_1) #obviously works fine
plot(x_3, x_1, add=TRUE) # Does not work. I keep getting error messages.
I would also like to add ablines to this plot.
I have experimented with a number of other plotting functions and I...
2008 Aug 04
2
Multivariate Regression with Weights
Hi all,
I'd like to fit a multivariate regression with the variance of the error term porportional to the predictors, like the WLS in the univariate case.
y_1~x_1+x_2
y_2~x_1+x_2
var(y_1)=x_1*sigma_1^2
var(y_2)=x_2*sigma_2^2
cov(y_1,y_2)=sqrt(x_1*x_2)*sigma_12^2
How can I specify this in R? Is there a corresponding function to the univariate specification lm(y~x,weights=x)?? Thanks.
Sincerely,
Yanwei Zhang
Department of Actuarial Research and Mode...
2009 Jun 11
2
Optimization Question
Hi All
Apologies if this is not the correct list for this question.
The Rglpk package offers the following example in its documentation
library(Rglpk)
## Simple mixed integer linear program.
## maximize: 3 x_1 + 1 x_2 + 3 x_3
## subject to: -1 x_1 + 2 x_2 + x_3 <= 4
## 4 x_2 - 3 x_3 <= 2
## x_1 - 3 x_2 + 2 x_3 <= 3
## x_1, x_3 are non-negative integers
## x_2 is a non-negative real number
obj <- c(3, 1, 3)
mat <- matrix(c(-1, 0, 1, 2, 4, -3, 1, -3, 2), nrow = 3)
dir <- c("<=&quo...
2004 Mar 16
3
multiple summation
Hello,
I have to compute a multiple summation (not an integration because the
independent variables a
are discrete) for all the values of a function of several variables f
(x_1,...,x_n), that is
sum ... sum f(x_1,...,x_n)
x_1 x_n
have you some suggestion? Is it possible?
I know that for multiple integration there is the function adapt, but it has at
most n=20. In my case n depends on the dimension of the dataset and, hence, it
could be bigger.
Thank you,
Paolo
2003 Feb 19
4
fitting a curve according to a custom loss function
Dear R-Users,
I need to find a smooth function f() and coefficients a_i that give the best
fit to
y ~ a_0 + a_1*f(x_1) + a_2*f(x_2)
Note that it is the same non-linear transformation f() that is applied to
both x_1 and x_2.
So my first question is how can I do it in R?
A more general question is this: suppose I have a utility function U(a_i,
f()), where f() is say a spline. Is there a general optimizer that cou...
2009 Oct 01
1
Help for 3D Plotting Data on 'Irregular' Grid
Dear All,
Here is what I am trying to achieve: I would like to plot some data in 3D.
Usually, one has a matrix of the kind
y_1(x_1) , y_1(x_2).....y_1(x_i)
y_2(x_1) , y_2(x_2).....y_2(x_i)
...........................................
y_n(x_1) , y_n(x_2)......y_n(x_i)
where e.g. y_2(x_1) is the value of y at time 2 at point x_1 (see that
the grid in x is the same for the y values at all times).
Instead, in my case, the quanti...
2009 Dec 04
2
Solve linear program without objective function
Dear R-users,
i try to solve to following linear programm in R
0 * x_1 + 2/3 * x_2 + 1/3 * x_3 + 1/3 * x_4 = 0.3
x_1 + x_2 + x_3 + x_4 = 1
x_1, x_2, x_3, x_4 > 0,
x_1, x_2, x_3, x_4 < 1
as you can see i have no objective function here besides that i use the
following code.
library(lpSolve)
f.obj<-c(1,1,1,1)
f.con<-matrix(c(0,2/3,1/3,1/3,...
2019 Jun 24
1
Calculation of e^{z^2/2} for a normal deviate z
...;root=copula )
{Yes, this GPL-2 licenced {with Copyright, see file, please
keep this one line}
## Copyright (C) 2012 Marius Hofert, Ivan Kojadinovic, Martin Maechler, and Jun Y
}
----------------------------------------------------------------------
##' Properly compute log(x_1 + .. + x_n) for a given (n x d)-matrix of n row
##' vectors log(x_1),..,log(x_n) (each of dimension d)
##' Here, x_i > 0 for all i
##' @title Properly compute the logarithm of a sum
##' @param lx (n,d)-matrix containing the row vectors log(x_1),..,log(x_n)
##' each of...
2007 Mar 29
3
Tail area of sum of Chi-square variables
Dear R experts,
I was wondering if there are any R functions that give the tail area
of a sum of chisquare distributions of the type:
a_1 X_1 + a_2 X_2
where a_1 and a_2 are constants and X_1 and X_2 are independent chi-square variables with different degrees of freedom.
Thanks,
Klaus
--
"Feel free" - 5 GB Mailbox, 50 FreeSMS/Monat ...
2011 Apr 06
7
Quiz: Who finds the nicest form of X_1^\prime?
Dear expeRts,
I would like to create a plotmath-label of the form X_1^\prime. Here is how to *not* do it [not nicely aligned symbols]:
plot(0,0,main=expression(italic(X*minute[1])))
plot(0,0,main=expression(italic(X[1]*minute)))
plot(0,0,main=expression(italic(X)[1]*minute))
Any suggestions?
Cheers,
Marius
2019 May 16
3
nrow(rbind(character(), character())) returns 2 (as documented but very unintuitive, IMHO)
Hi Hadley,
Thanks for the counterpoint. Response below.
On Thu, May 16, 2019 at 1:59 PM Hadley Wickham <h.wickham at gmail.com> wrote:
> The existing behaviour seems inutitive to me. I would consider these
> invariants for n vector x_i's each with size m:
>
> * nrow(rbind(x_1, x_2, ..., x_n)) equals n
>
Personally, no I wouldn't. I would consider m==0 a degenerate case, where
there is no data, but I personally find matrices (or data.frames) with rows
but no columns a very strange concept. The converse is not true, I
understand the utility of columns but no rows,...
2013 Mar 05
2
Issues when using interaction term with a lagged variable
Hi there!
Today I tried to estimate models using both plm and pgmm functions, with an
interaction between X1 and lag(X2, 1). And I notice two issues.
Let "Y=b_1 * X_1 + b_2 * X_2 + b_3 * X_1 * x_2 + e" be our model.
1) When using plm, I got different results when I coded the interaction
term with I(X1 * lag(X2, 1)) and when I just saved this multiplication X1 *
lag(X2, 1) in a different variable of the dataset and then used it. in the
regression.
2) With...
2012 Sep 20
1
Gummy Variable : Doubt
Hi,
I have a system in which I analyze 2 subjects and 1 variable, so I have
2 models as follow:
y ~ x_1[, 1] + x_2[, 1] + x_1[, 2] + x_2[, 2]
Where
x_1[, i] = cos(2 * pi * t / T_i)
x_2[, i] = sin(2 * pi * t / T_i)
i = 1, 2
Data have two columns: t and y.
As you can see, I have a multiple components model, with rithm and
without trends, and I have a fundamental period (T_1 = 24 h...
2010 Sep 08
11
problem with outer
...age. i hope someone can help me.
Error in dim(robj) <- c(dX, dY) :
dims [product 16] do not match the length of object [1]
p_11=seq(0,0.3,0.1)
p_12=seq(0.1,0.4,0.1)
guete = function(p_11,p_12) {
set.seed(1000)
S_vek=matrix(0,nrow=N,ncol=1)
for(i in 1:N) {
X_0=rmultinom(q-1,size=1,prob=p_0)
X_1=rmultinom(n-q+1,size=1,prob=cbind(p_11,p_12,(1-p_11-p_12)))
N_0=apply(X_0[,(n-2*k-L+1):(n-k-L)],1,sum)
N_1=apply(X_1[,(n-q-k+2):(n-q+1)],1,sum)
S_vek[i]=((sum(((N_1-k*cbind(p_11,p_12,(1-p_11-p_12)))^2)/k*cbind(p_11,p_12,(1-p_11-p_12))))/(sum(((N_0-k*p_0)^2)/k*p_0)))-1
}
1-mean(f_1<=S_vek & S...
2005 Nov 24
1
residuals in logistic regression model
In the logistic regression model, there is no residual
log (pi/(1-pi)) = beta_0 + beta_1*X_1 + .....
But glm model will return
residuals
What is that?
How to understand this? Can we put some residual in the logistic regression
model by replacing pi with pi' (the estimated pi)?
log (pi'/(1-pi')) = beta_0 + beta_1*X_1 + .....+ ei
Thanks!
[[alternative HTML version delete...
2007 Feb 02
1
multinomial logistic regression with equality constraints?
I'm interested in doing multinomial logistic regression with equality
constraints on some of the parameter values. For example, with
categorical outcomes Y_1 (baseline), Y_2, and Y_3, and covariates X_1
and X_2, I might want to impose the equality constraint that
\beta_{2,1} = \beta_{3,2}
that is, that the effect of X_1 on the logit of Y_2 is the same as the
effect of X_2 on the logit of Y_3.
Is there an existing facility or package in R for doing this? Would
multinomRob fit the bill?
M...
2007 Dec 20
1
Recursive solution with for()
Hello,
i just ran into the following problem: I wanted to recursively solve
equations of the type x_1[t]=x_1[t+1]+beta*x_2[t], and used a for-loop
written
for(j in c(1:t-1, recursive=TRUE){
...
}
This didn't work, so i resolved to writing
for(j in c(10,9,...,1){
which worked, but is not terribly efficient. So, what did I do wrong?
Thanks in advance,
Owe
--
Owe Jessen
Diplom-Volkswirt
Han...
2010 Nov 03
1
Orthogonalization with different inner products
Suppose one wanted to consider random variables X_1,...X_n and from each subtract off the piece which is correlated with the previous variables in the list. i.e. make new variables Z_i so that Z_1=X_1 and Z_i=X_i-cov(X_i,Z_1)Z_1/var(Z_1)-...- cov(X_i,Z__{i-1})Z__{i-1}/var(Z_{i-1}) I have code to do this but I keep getting a "non-conformable ar...
2009 Feb 12
1
General query regarding scoring new observations
Hi,
I was wondering if I can have some advice on the following problem.
Let's say that I have a problem in which I want to predict a binary outcome
and I use logistic regression for that purpose. In addition, suppose that my
model includes predictors that will not be used in scoring new observations
but must be used during model training to absorb certain effects that could
bias the