Displaying 16 results from an estimated 16 matches for "matx".
Did you mean:
math
2006 Mar 22
1
mixed ordinal logistic regression
Dear Colleagues,
I hope to know how ordinal logistic regression with a mixed model is made
in R. We (My colleague and I) are studying the behavior of a beetle. The
attraction of beetles to a stimulus are recorded: the response is Slow,
Mid, or Fast. They are based on the time after the presentation of the
stimulus to the beetles. Because we do not observe the behavior
continuously but do
2006 Mar 22
0
Use of the index of a for loop to assign values to the ro ws of a series of variables
...Thanks in advance,
> domenico
>
> --------------------------------------------------------------
> --------------------------------------------------------------
> ------------------------------
> rm(list = ls())
> posfix=1:5* 10
> for(i in posfix)
> assign(paste("matX.",i,sep=""),matrix(0,3,2))
> ls()
>
> [1] "i" "matX.10" "matX.20" "matX.30" "matX.40"
> "matX.50" "posfix"
> AT THIS STEP I HAVE 5 MATRIX OF ZEROS (3 ROWS PER 2 COLUMNS)
> NOW I WOULD LIK...
2013 Feb 10
3
Constrained Optimization in R (alabama)
...row
of the parameter matrix should sum to 1 and their product to 0. I don't
understand why the constraints are not satisfied at the solution. I must be
misinterpreting how to specify the constrains somehow.
library(alabama)
ff <- function (x) {
mm <- matrix(c(10, 25, 5, 10), 2, 2)
matx <- matrix(x, 2, 2)
-sum(apply(mm ^ matx, 1, prod))
}
### constraints
heq <- function(x) {
h <- rep(NA, 1)
h[1] <- x[1] + x[3] -1
h[2] <- x[2] + x[4] -1
h[3] <- x[1] * x[3]
h[4] <- x[2] * x[4]
h
}
res <- constrOptim.nl(par = c(1, 1, 1, 1), fn = ff,...
2012 May 29
1
need help to find type I error rate for modified F statistic
...;-rep(NA,asim)
hx<-rep(NA,asim)
xbar.t<-rep(NA,asim)
num<-rep(NA,asim)
df2<-rep(NA,asim)
denom<-rep(NA,asim)
F<-rep(NA,asim)
asim<-1000
for(j in 1:asim)
{
print(j)
set.seed(j)
a<-rnorm(15,0,1)
b<-rnorm(15,0,1)
w<-a*exp(h*a^2/2)
x<-b*exp(h*b^2/2)
matw<-sort(w)
matx<-sort(x)
trim1[j]=1/((1-2*alpha)*n)*(sum(matw[i:m])+r*(matw[k]+matw[n-k+1]))
trim2[j]=1/((1-2*alpha)*n)*(sum(matx[i:m])+r*(matx[k]+matx[n-k+1]))
madN1[j]<-mad(w)
madN2[j]<-mad(x)
lo.w[j]<-length(which(w-median(w)<(-2.24*madN1[j])))
up.w[j]<-length(which(w-median(w)>(2.24*mad...
2013 Feb 09
1
Optimization Problem in R
...arameter being either 0 or 1, and (2) the sum of each row in the
parameter matrix should equal 1.
I'm using the function constrOptim as shown below, but obviously I'm not
doing things right. Any help is much appreciated.
ff <- function (x) {
mm <- matrix(c(10, 25, 5, 10), 2, 2)
matx <- matrix(NA, 2, 2)
for (i in 1:nrow(x)) {
for (j in 1:ncol(x)) {
matx[i, j] <- x[i, j]
}
}
-sum(apply(mm ^ matx, 1, prod))
}
constrOptim(theta = c(0, 0, 0, 0), f = ff, ui=rbind(c(1, 1),
c(1, 1)),...
2008 Oct 09
2
vectorization instead of using loop
Dear all,
I've sent this question 2 days ago and got response from Sarah. Thanks for
that. But unfortunately, it did not really solve our problem. The main issue
is that we want to use our own (manipulated) covariance matrix in the
calculation of the mahalanobis distance. Does anyone know how to vectorize
the below code instead of using a loop (which slows it down)?
I'd really appreciate
2011 Sep 07
1
Weight in Function RM
...on in R. However, I have a question why the results from
1) lm(formula = Y~aX, weight = w)
2) lm(formula = wY~waX)
are different. Aren't they supposed to have the exactly same result?
Below are the R code to see difference in regression results
MatY <- c(0.15,0.42,0.31,0.22)
MatX <- rbind(c(1,0,0),c(0,1,0),c(1,0,0),c(0,0,1))
Data <- data.frame(cbind(MatY,MatX))
colnames(Data)[2]<-paste("IndSub1")
colnames(Data)[3]<-paste("IndSub2")
colnames(Data)[4]<-paste("IndSub3")
Weight <- c(0.1,0.4,0.3,0.2)
Result<- lm(formula = MatY~...
2010 Jul 02
4
mainboard recommendations
Hi,
As it has been brought to my attention (by several parties), my current
MB does not support VT-d.
Since I don''t feel like purchasing a brand new system, I have searched
for replacement MB-s
that would fit into my existing uATX case, support my C2D CPU, and
support at least 4x2GB ram.
I have narrowed it down to the following four models:
SUPERMICRO MBD-C2SBM-Q-O (Q35 chipset)
2005 Aug 16
2
problem using model.frame()
Hi I'm having a problem with model.frame, encapsulated in this example:
y1 <- matrix(c(3,1,0,1,0,1,1,0,0,0,1,0,0,0,1,1,0,1,1,1),
nrow = 5, byrow = TRUE)
y1 <- as.data.frame(y1)
rownames(y1) <- paste("site", 1:5, sep = "")
colnames(y1) <- paste("spp", 1:4, sep = "")
y1
model.frame(~ y1)
Error in model.frame(formula, rownames,
2006 Jan 06
0
x86_64 and memory reservation
Hi,
I have an Athlon 64 2800+ with an ASUS K8V-MX mATX motherboard.
2x512 MB DDR400 Ram.
Now the problem: 8MB of RAM is used by the shared memory of the video
card, so I would expect 1016MB RAM to be available for Linux (that's how
much the BIOS shows).
Indeed if I go into memtest86+ v1.50 then I see:
in e820-Std mode: 1015MB ram, with 432K rese...
2006 Mar 07
0
Asterisk Compatible Server Architecture
...sterisk has run into some problems with certain hardware
configurations so I thought I'd vet my proposed architecture with the
board. Note that I'll be running Asterisk 1.2 on Re Hat 9.0 and I
need to support a TDM400 card.
Many thanks for your comments.
Hugh
Motherboard
Asus P5GD1-VM - MATX Intel P4 775 w i915G cs, 1 PCI-X, OB Aud/Lan/Vid,
Dual Chan, SATA
CPU
Intel P4 630 3.0GHz With 2MB Cache, Socket 775
RAM
(2x1GB) Dual Channel PC3200 DDR 400
HD
Seagate SATA 80GB 8MB, 7200rpm
Chassis
ANTEC 3U25ATX450XR-2 3U RM SERVER CHASSIS 450W ATX 12V
2012 Mar 23
0
a question about using function ssanova of package gss in R version 2.14.1 (2011-12-22)
...o help.
Type 'q()' to quit R.
> library(gss)
>
> set.seed(5732)
> x=(1:100)/100
> y=1+3*sin(2*pi*x)+2*(x>0.7)+rnorm(x)
>
>
>
> x1=rnorm(100)
> x2=rnorm(100)
>
> part.fit=ssanova(y~x, partial=~cbind(x1,x2))
>
> summary(part.fit)
Error in cbind(s, matx.p[, label]) : subscript out of bounds
>
> part.fit=ssanova(y~x, partial=~cbind(as.numeric(x1),x2))
>
> summary(part.fit)
Call:
ssanova(formula = y ~ x, partial = ~cbind(as.numeric(x1), x2))
Estimate of error standard deviation: 1.138695
Residuals:
Min 1Q Median...
2009 Jul 16
4
Save results
I imagine I make a function whose results are a Matrix Z
How cn I save in a txt or excel file the result of apply my function?
something similar to save Z.txt.
Thanks in advance.
[[alternative HTML version deleted]]
2012 Mar 10
1
Draw values from multiple data sets as inputs to a Monte-Carlo function; then apply across entire matrix
Hi all,
I am trying to implement a Monte-Carlo simulation for each cell in a
spatial matrix (using mcd2 package) .
I have figured out how to conduct the simulation using data from a single
location (where I manually input distribution parameters into the R code),
but am having trouble (a) adjusting the code to pull input variables from
my various data sets and then (b) applying the entire
2006 Dec 18
3
Upgrading Server Motherboard
I have a server running CentOS 4.2 that works as a web/email with very
heavy load. It runs Directadmin web gui which is like Cpanel. It
runs on a cheapy mATX motherboard(ECS 741GX-M) with socket A 2800+ CPU
and 2Gbyte DDR. The OS and data are on a 300Gbyte PATA maxtor drive
and data backups are run weekly to another PATA drive. The server is
overwelmed and data backups take over 5 hours to complete. I have a
Tyan(K8E) server board now that is socket...
2006 Dec 19
1
Re: CentOS Digest, Vol 23, Issue 18
...f40612180911j10bccb6hd356fdf1a4c7e021 at mail.gmail.com>
> Content-Type: text/plain; charset=ISO-8859-1; format=flowed
>
> I have a server running CentOS 4.2 that works as a web/email with very
> heavy load. It runs Directadmin web gui which is like Cpanel. It
> runs on a cheapy mATX motherboard(ECS 741GX-M) with socket A 2800+ CPU
> and 2Gbyte DDR. The OS and data are on a 300Gbyte PATA maxtor drive
> and data backups are run weekly to another PATA drive. The server is
> overwelmed and data backups take over 5 hours to complete. I have a
> Tyan(K8E) server board...