search for: invert

Displaying 20 results from an estimated 1330 matches for "invert".

Did you mean: insert
2006 Nov 20
1
sem package subscript out of bounds error
...e all in the model. I've tried this with simpler version of the below model, and keep getting the same error. What does this error mean? Below is the full code, but I've tried this with all sorts of subsets of the model, making sure to keep all of the proper error terms. --- fish.invert.data<-data.frame(Prev.Year.Predatory.Invert.Abundance, Prev.Year.Predatory.Fish.Abundance, Predatory.Invert.Abundance, Predatory.Fish.Abundance, Prev.Year.Herbivorous.Invert.Abundance, Prev.Year.Herbivorous.Fish.Abundance, Herbivorous.Invert.Abundance, H...
2010 May 26
1
[LLVMdev] How to handle predicate registers which can also work inverted way.
...that in the predicated instruction do not contain only the predicate register, but a predicate register and boolean value pair, the boolean value stating if the instruction is to be executed only if the register is true(normal behavior of predicate regs) or only if the predicate reg is false("inverted behaviour") So, for eample if we have a machine without "not equal"(ne) operation and we have a code where we would have an "ne" comparison followed by predicated jump, it is possible to do this with "eq" comparison followed by a inverted-predicate predicated...
2011 Jan 03
4
how to invert the axes in the wireframe() plot
Dear List, I am using the wireframe function in the lattice package, and I am wondering if it is possible to invert the default axes orientation for x and y axes... what parameter should I look for? Best regards, Simone Gabbriellini
2007 Aug 13
3
invert 160000x160000 matrix
Can R invert a 160000x160000 matrix with all positive numbers? Thanks a lot!
2006 Nov 07
4
solve computationally singular
Hi uRsers, when inverting a 2 by 2 matrix using solve, I encountered a error message: solve.default(sigma, tol = 1e-07) : system is computationally singular: reciprocal condition number = 1.7671e-017 and then I test the determinant of this matrix: 6.341393e-06. In my program, I have a condition block that whet...
2009 Oct 29
4
Invert the sign of a number
Hello, just a simple question How can I do to invert the sign of a number? (for example: -4 to 4, 2 to -2 and so on..) I was looking for a specific function in R but I didn't found it... thank you Francesco -- View this message in context: http://www.nabble.com/Invert-the-sign-of-a-number-tp26110267p26110267.html Sent from the R help mailing li...
2003 Jul 07
2
(PR#3427)
Hi; I am having problems inverting matrices using the function solve() For example R can not invert the following matrix [,1] [,2] [,3] [,4] [,5] [1,] 25 500 11250 275000 7.106250e+06 [2,] 500...
2005 May 30
3
how to invert the matrix with quite small eigenvalues
.... a<-diag(c(rep(3,4),1e-18)) # a matrix with small eigenvalues b<-matrix(1:25,ncol=5) # define b to get an orthogonal matrix b<-b+t(b) bb<-eigen(b,symmetric=T) aah<-bb$vectors%*%diag(1/sqrt(diag(a))) aa<-aah%*%t(aah) # aa should have the same eigenvalues as a and should be #invertable,however, solve(aa) # can not be solved solve(aa,tol=1e-19) # can be inverted, however, it is not symmetric and furthermore, solve(aa,tol=1e-19)%*%aa # deviate much from the identity matrix I have already define aa to make sure it is symmetric. So the inverse should be symmetric. Does the p...
2012 Sep 29
5
Generating by inverting function
Hello, I am trying to generate random survival times by inverting the function,  S(t)= exp(b*F(t)), where b is constant and F(t) is some cumulative distribution function, let say that F(t) is cdf of normal distribution or any others distributions.   as we know that S(t) has uniform distribution on  (0,1) so we can write that U= exp(b*F(t)), where U is uniform...
2005 Dec 09
2
Matrix Problem
Hello R-Users, I have to invert a matrix 3000X3000 and the solve method doesn't work or it is too slow. Are there any methods to invert a big matrix? Regards Stefan --------------------------------- [[alternative HTML version deleted]]
2006 Jun 25
1
Inverting a large Matrix (14000 x 14000)
Hi.. I have to invert a 15000 x 15000 matrix (generalized inverse). I do run the process on a fairly powerful computer. but still complains indufficient memory. Is there a way one can invert a large matrix in some other efficient manner. Thanks Harsh --------------------------------- [[alternativ...
2009 Apr 05
1
inverting a table
Is there an easy way to invert a table? (not to solve for the inverted matrix, just swap rows for columns & vice versa). I've gone through my data manipulation bible (Phil Spector's book), but to no avail. [[alternative HTML version deleted]]
2006 Aug 24
1
ups.firmware
Hi all. As the subject has come up. Powerware ups may contain several cpu's and different firmware versions. Five of them is always ordered in a specific way. 1 control panel 2 inverter 3 rectifier 4 net interface card 5 display control So if a ups have a inverter cpu but not a control panel it sets the firmware revision to 00.00 to the control panel cpu, and get the version for the inverter. At the moment the driver is fetching the first version it find. And if it have a cont...
2012 Feb 05
1
Simulating from a Normal Inverted Wishart distribution
Hello everyone I was wondering how would one simulate from a Normal Wishart Distribution in R. A normal inverted Wishart distribution is denoted by NIW (M,C,d,S), where X/(Sigma) ~ N( M,C,(Sigma) ) -> a matrix normal distribution, (Sigma) -> column dispersion matrix (Sigma) ~ IW (d,S) -> inverted Wishart distribution Thanks a lot ! Best Shantanu [[alternative HTML version deleted]]
2009 Jun 17
1
Inverting a square matrix using solve() with LAPACK=TRUE (PR#13762)
Full_Name: Ravi Varadhan Version: 2.8.1 OS: Windows Submission from: (NULL) (162.129.251.19) Inverting a matrix with solve(), but using LAPACK=TRUE, gives erroneous results: Here is an example: hilbert <- function(n) { i <- 1:n; 1 / outer(i - 1, i, "+") } h5 <- hilbert(5) hinv1 <- solve(qr(h5)) hinv2 <- solve(qr(h5, LAPACK=TRUE)) all.equal(hinv1, hinv2) # The...
2007 Apr 10
1
Testing invertibility of an AR model
I've looked around but I can't find the method in R for testing whether the resulting estimated coefficients of an AR model imply that the model is invertible. To quote from eric zivot's blue book : " the AR(p) is invertible provided the rots of the characteristic equation Phi(z) = 1 - phi_1*z - phi_2*z^2 = phi_3*z^3 - ..... Phi_p*z^p = 0 lie outside the complex circle". I can't find a function nor do I know how to do the above...
2020 Oct 13
1
Nouveau DRM failure on 5120x1440 screen with 5.8/5.9 kernel
...01:00.0 0300: 10de:0dfc (rev a1) 01:00.0 VGA compatible controller: NVIDIA Corporation GF108GLM [NVS 5200M] (rev a1) xrandr available resolutions reported (from Linux 5.7 using Xorg): Screen 0: minimum 320 x 200, current 5120 x 1440, maximum 16384 x 16384 LVDS-1 unknown connection (normal left inverted right x axis y axis) 1600x900 59.99 + 40.00 5120x1440 60.00 1360x1020 73.97 1152x864 59.97 1024x768 59.95 800x600 59.96 640x480 59.94 DP-1 disconnected (normal left inverted right x axis y axis) DP-2 connected primary 5120x1440+0+0 (...
2016 Feb 27
1
xrandr configuration questions
When I execute xrandr I receive, omitting the details of resolution options, Screen 0: minimum 320 x 200, current 1920 x 1080, maximum 8192 x 8192 LVDS-1 unknown connection (normal left inverted right x axis y axis) DP-1 disconnected (normal left inverted right x axis y axis) HDMI-1 disconnected (normal left inverted right x axis y axis) HDMI-2 connected 1920x1080+0+0 (normal left inverted right x axis y axis) 698mm x 392mm I am running on a Alienware 18 laptop that as far as I know ha...
2003 Jul 21
0
correlated residuals in gls: Coefficient matrix not invertible
...ion = corARMA(p=5, q=1)): y.na <- as.data.frame(y[complete.cases(y),]) y.gls <- gls(z ~ x + y, data = y.na, correlation=corARMA(p=5, q=1)) It gave this error message: Error in "coef<-.corARMA"(*tmp*, value = c(188.077895742055, 180.123242661068, : Coefficient matrix not invertible I tried the gls allowing residuals following AR(1): y.gls <- gls(z ~ x + y, data = y.na, correlation=corAR1()) and it works. Actually I found in the correlation structure, as long as I set the p larger than 1 (ARMA(2, 1) OR ARMA(3,1)), I will have the error message saying "Coefficie...
2005 Nov 16
2
invert y-axis in barplot
Hi! This is probably a very trivial question. Is there an easy way to invert the y-axis (low values on top) when using the function barplot()? Thanks, Jörg [[alternative HTML version deleted]]