Displaying 20 results from an estimated 46 matches for "5x5".
Did you mean:
55
2016 Feb 09
4
OpenSwan Drop Out Issue
...emoving it completely (which I believe defaults it to 30
seconds), neither of which made any difference.
I can't see any very obvious errors in the logs, however the most recent
drop out produced the following message around the same time:
Feb 10 00:53:09 site-b-vpn pluto[30584]: "site-a/5x5" #39: max number of
retransmissions (2) reached STATE_QUICK_I1
Feb 10 00:53:09 site-b-vpn pluto[30584]: "site-a/5x5" #39: starting keying
attempt 2 of an unlimited number
Feb 10 00:53:09 site-b-vpn pluto[30584]: "site-a/5x5" #95: initiating Quick
Mode PSK+ENCRYPT+TUNNEL+PFS...
2007 Feb 19
1
need help in reading TOMS observed ASCII data file
Hello R Users,
I am new to R.
I have two data sets i) TOMS aerosol optical depth(AOD) and ii) TOMS
ozone(O3).
>
> AOD data is on 1x1 grid and O3 data is on 5x5 grid.
>
> First I want to read AOD and O3 as it is and then I want to regrid AOD on
> 5x5 grid as O3.
>
> Reading is first problem.
>
> FIRST PROBLEM READING AOD:
>
> AOD data is in following format:
>
> #########
> Latitute: 89.5
> 167 0 0 0 0 0 182 0 0 0 0 0...
2012 May 23
1
numerical integration
...ode is suboptimal.
What is wrong with it?
a = 0.08 # alpha
M <- function(j,s){ return(exp(-j*a*s)) }
# Inner product in $L^2([0,+\oo))$
#
innerProduct <- function(f,g){
integrand <- function(s){ return(f(s)*g(s)) }
return(integrate(integrand,lower=0,upper=Inf)$value)
}
# The 5x5 matrix of the L^2-inner products of $M_1,\dots,M_5$.
#
numericalDotProductMatrix_M <- function(){
A <- matrix(0,5,5)
for(i in seq(1:5))
for(j in seq(i:5)){
f <- function(s){ return(M(i,s)) }
g <- function(s){...
2015 Apr 17
0
[ANNOUNCE] x11perf 1.6.0
...each run
and several new test options:
-crgb10text Char in 80-char rgb core line (Charter 10)
-crgb24text Char in 30-char rgb core line (Charter 24)
-crgbftext Char in 80-char rgb core line (Courier 12)
-magpixwin10 Scale 5x5 from pixmap to 10x10 window
-magpixwin100 Scale 50x50 from pixmap to 100x100 window
-magpixwin500 Scale 250x250 from pixmap to 500x500 window
-minpixwin10 Scale 10x10 from pixmap to 5x5 window
-minpixwin100 Scale 100x100 from pixm...
2007 Jan 24
2
modify rectangle color from image
Hi,
I need some suggestion on how I could modify the color on some
rectangle that I have created using "image".
In other words, I have a 5x5 matrix, say, m.
m <- matrix(rnorm(25), nrow=5)
I create a grid of rectangles by:
image(m)
Now I want to change the color of rectangle (3,3) to blue.
I don't know how this could be done, and searching the web has given
me no hint.
Thanks for your help.
--
saurav
2007 Feb 19
0
problem in reading TOMS observed ASCII data file
Hello R Users,
I have two data sets i) TOMS aerosol optical depth(AOD) and ii) TOMS
ozone(O3).
AOD data is on 1x1 grid and O3 data is on 5x5 grid.
First I want to read AOD and O3 as it is and then I want to regrid AOD on
5x5 grid as O3.
Reading is first problem.
FIRST PROBLEM READING AOD:
AOD data is in following format:
#########
Latitute: 89.5
167 0 0 0 0 0 182 0 0 0 0 0 0 0 0 0 0 0 0 200 0 0 0 0 0 0
0 0 0 0 0 0 0 0 0 0 0 0 0 0 1...
2016 Feb 09
0
OpenSwan Drop Out Issue
...I believe defaults it to 30
> seconds), neither of which made any difference.
>
> I can't see any very obvious errors in the logs, however the most recent
> drop out produced the following message around the same time:
>
> Feb 10 00:53:09 site-b-vpn pluto[30584]: "site-a/5x5" #39: max number of
> retransmissions (2) reached STATE_QUICK_I1
> Feb 10 00:53:09 site-b-vpn pluto[30584]: "site-a/5x5" #39: starting keying
> attempt 2 of an unlimited number
> Feb 10 00:53:09 site-b-vpn pluto[30584]: "site-a/5x5" #95: initiating Quick
> Mo...
2006 Jul 27
3
how to resample (or resize) matrix?
Dear r-help,
I have a matrix, suppose, 10x10, and I need the matrix 5x5, having
in each cell a mean value of the cells from the initial matrix.
Please, point me to a function in R, which can help me doing that.
Digging the documentation and mail archives didn't give me a result.
Thank you.
---
Best regards,
Vladimir mailto:wl at eimb....
2005 Aug 12
6
evaluating string variables
Hello!!!
I have a folder (C:/R/) with matrix files, named by number, i.e.
0.mat, 1.mat,...,1250.mat. In this case, they are 5x5 simetric
matrices. I would like to compute a property for each matrix and put
calculated values into a data frame for posterior ploting and
printing. Below there is an example for 7 matrices (0.mat..6.mat)
#define data frame
L <- data.frame(frame=numeric(7), L=numeric(7))
f0<-1/(5*(5-1)) # f...
2003 Jul 07
2
(PR#3427)
...275000 7106250 190625000 5247656250
1.471719e+11
[5,] 7106250 190625000 5247656250 147171875000
4.184754e+12
solve(t(xxmodel)%*%(xxmodel))
Yields the following massage:
Error in solve.default(t(xxmodel) %*% (xxmodel)) : singular matrix `a'
in solve
The above 5X5 matrix is invertible. It has non-zero eigenvalues. Could
someone explain whether there is a problem in R's solve() function.
Dursun Bulutoglu
2004 Jul 16
1
median filter
Dear R users,
Does anyone know if there's a median filter available in R?
I have a considerable amount of images as 256 by 256 matrices and want to
smooth them with a 5x5 median filter. Until now I'm not lucky in searching
the R-help list/files.
Thanks,
Hanneke
ir. J.M. (Hanneke) Schuurmans (PhD student)
Department of Physical Geography
Faculty of Geosciences, Utrecht University, The Netherlands
E-mail: h.schuurmans@geog.uu.nl
Telephone: +31(0)30-2532988 (di...
2009 Jun 01
1
using "cochran.test()" as a "mcnemar.test()" ?
Hello all
I wish to perform a mcnemar.test() for a 5X5 matrix.
Wikipedia tells me (http://en.wikipedia.org/wiki/Cochran_test) I should turn
to cochran.test.
The only place I found it was in the "outliers" package, but the command
cochran.test() acts differently then mcnemar.test() , and doesn't take a
table as input.
Any ideas on how to...
2010 Jan 14
1
Extracting data from a list of matrices
Hi,
Apologies in advance for the basic nature of my question. I am still very
much a rookie when it comes to R. Having googled it, checked Nabble and
trial/error to the best of my ability, I have yet to find an easy solution.
I am currently working with a list of 5x5 matrices, and want to extract a
list consisting of the first number of each matrix.
In other words I want to go from:
[[1]]
[,1] [,2] [,3] [,4] [,5]
[1,] a X X X X
[2,] X...
2007 May 11
1
Create an AR(1) covariance matrix
...ovariance matrix
(AR(1)) for a longitudinal mixed-model simulation. I can do this
using nested "for" loops but I'm trying to improve my R coding
proficiency and am curious how it might be done in a more elegant
manner.
To be clear, if there are 5 time points then the AR(1) matrix is 5x5
where the diagonal is a constant variance (sigma^2) and the
covariances depend on the number of "steps" between trials. So, the
first off-diagonal of the matrix is sigma*rho, the second off-diagonal
is sigma*rho^2, the third off-diagonal is sigma*rho^3, and so forth.
Any suggestions for...
2008 May 18
1
predict.prcomp: 'newdata' does not have the correct number of columns
...- prcomp(x1)
> predict(p, x2)
Error in predict.prcomp(p, x2) :
'newdata' does not have the correct number of columns
> dim(x2)
[1] 5 20
> dim(p$rotation)
[1] 20 5
All predict.prcomp really does is x2 %*% p$rotation, which is a
perfectly legal operation that should yield a 5x5 matrix:
> dim(x2 %*% p$rotation)
[1] 5 5
Thanks,
Gad
--
Gad Abraham
Dept. CSSE and NICTA
The University of Melbourne
Parkville 3010, Victoria, Australia
email: gabraham at csse.unimelb.edu.au
web: http://www.csse.unimelb.edu.au/~gabraham
2009 Jul 22
1
R extract vertices for polygon
...P) the coordinates of the vertices of the different groups (i.e. 3, 7, 1 . . .) to plot the polygons to delineate the area in which each group "wins" and colour it diferentially. I can make a simple point plot, but I would like to add polygons with full colored area. The example is with a 5x5 matrix, but I'm working with 500 x 500 matrix, so hand work is difficult,
Any suggestion will be welcomed.
Nrep=5
GROUP<-matrix(c(3,3,3,3,7,3,3,3,3,7,1,3,3,3,7,1,3,3,3,7,1,1,4,4,0),Nrep,Nrep)
column<- seq(1, 5, length=Nrep)
row<- seq(0,10,length=Nrep)
colnames(GROUP)<- ro...
2012 May 23
0
numerical integrals
...e is suboptimal.
What is wrong with it?
a = 0.08 # alpha
M <- function(j,s){ return(exp(-j*a*s)) }
# Inner product in $L^2([0,+\oo))$
#
innerProduct <- function(f,g){
integrand <- function(s){ return(f(s)*g(s)) }
return(integrate(integrand,lower=0,upper=Inf)$value)
}
# The 5x5 matrix of the L^2-inner products of $M_1,\dots,M_5$.
#
numericalDotProductMatrix_M <- function(){
A <- matrix(0,5,5)
for(i in seq(1:5))
for(j in seq(i:5)){
f <- function(s){ return(M_j(i,s)) }
g <- function(s)...
2013 May 01
1
diag() when input is a numeric scalar
...why when passing a single numeric value that contains any
decimals to diag() that the value is silently coerced to a integer for
constructing an identify matrix. To me, an input like diag(5.435) seems
fairly ambiguous and is more than likely a programming mistake, since it's
not obvious that a 5x5 identity matrix should be created. I've seen some
code where other writers have been burned on this as well, especially when
trying extract diagonal elements but forget about the scalar case. A warning
or message would help track this problem down really quickly to force the
author to use diag(...
2011 Apr 07
1
An extention of outer() ?
...f x and y. However I have slightly modified version of that, where x
is a matrix with, say, 5 rows and 2 columns and y is a vector. Let take
following example:
fn1 <- function(x1, x2, y) return (x1+x2+y)
x <- matrix(1:10, nc = 2)
y <- 1:5
with this input, I want to construct a 5x5 matrix whose (1,1)th element will
be : fn1(x[1,1], x[1,2], y[1]), (1,2)th element will be : fn1(x[1,1],
x[1,2], y[2])..... (1,5)th element will be : fn1(x[1,1], x[1,2],
y[5]).....similarly (2,1)th element will be : fn1(x[2,1], x[2,2],
y[1])....etc
If my 'x' object is a vector then I can...
2004 Nov 26
1
Namespaces, coercion and setAs
...else n <- length(from)
return(new("matrix.diag.csr", ra = from ,ja = as.integer(1:n),
ia = as.integer(1:(n+1)), dimension =
as.integer(c(n,n))))
})
This seemed to be fine. I could do,
A <- as(5,"matrix.diag.csr")
and A would be a 5x5 identity matrix in sparse form. But post-namespace
I get:
>A <- as(5,"matrix.diag.csr")
Error in as(5, "matrix.diag.csr") : No method or default for coercing
"numeric" to "matrix.diag.csr"
so apparently using exportClass(matrix.diag.csr) isn'...