Displaying 20 results from an estimated 201 matches for "unscaleable".
Did you mean:
unscalable
2007 Aug 14
1
cov.unscaled in gls object
Hi list,
can I extract the cov.unscaled ("the unscaled covariance matrix") from a
gls fit (package nlme), like with summary.lm? Background: In a fixed
effect meta analysis regression the standard errors of the coefficients
can be computed as sqrt(diag(cov.unscaled)) where cov.unscaled is
(X'WX). I try do do this with a gls-fit.
Thanks, Sven
2010 Sep 05
0
cov.unscaled in NLS - how to define cov.scaled to make comparable to SAS proc NLIN output - and theoretically WHY are they different
I am running a 3-parameter nonlinear fit using the default Gauss-Newton
method of nls.
initialValues.L = list(b=4,d=0.04,t=180);
fit.nls.L = nls(
myModel.nlm ,
fData.L,
start = initialValues.L,
control = nls.control(warnOnly = TRUE),
trace=T
);
summary.nls.L = summary(fit.nls.L);
I run the same analysis in SAS proc NLIN.
proc nlin data=apples outest=a;
parms b=4 d=.04 t=180;
model Y =
2018 Jun 05
3
[RFC][SVE] Supporting SIMD instruction sets with variable vector lengths
Hi David,
Thanks for taking a look.
> On 5 Jun 2018, at 16:23, dag at cray.com wrote:
>
> Hi Graham,
>
> Just a few initial comments.
>
> Graham Hunter <Graham.Hunter at arm.com> writes:
>
>> ``<scalable x 4 x i32>`` and ``<scalable x 8 x i16>`` have the same number of
>> bytes.
>
> "scalable" instead of "scalable
2007 Jul 07
2
No convergence using ADAPT
I am trying calculate a probability using numerical integration. The first
program I ran spit out an answer in a very short time. The program is below:
## START PROGRAM
trial <- function(input)
{
pmvnorm(lower = c(0,0), upper = c(2, 2), mean = input, sigma = matrix(c(.1, 0,
0, .1), nrow = 2, ncol = 2, byrow = FALSE))
}
require(mvtnorm)
require(adapt)
bottomB <- -5*sqrt(.1)
topB <-
2006 Jun 02
3
lm() variance covariance matrix of coefficients.
Hi,
I am running a simple linear model with (say) 5 independent variables. Is
there a simple way of getting the variance-covariance matrix of the
coeffcient estimates? None of the values of the lm() seem to provide this.
Thanks in advance,
Ritwik Sinha
rsinha@darwin.cwru.edu
Grad Student
Case Western Reserve University
[[alternative HTML version deleted]]
2006 Mar 16
0
Scaled or unscaled variance covariance matrix
Hi, does anyone know which of the scaled or unscaled version of the
variance-covariance matrix of regression coefficients (as produced by
ls.diag) is the correct one, or when one is better than the other? I am
interested in univariate linear regression (lm). Thank you very much.
Dipl.-Psych. Johannes Ullrich
Philipps-Universit?t Marburg
Fachbereich
2003 Mar 31
4
"font problems in X11 with linux R"
Hello,
I''m inexperienced with linux, X11 and R. A font problem have surfaced. When I
use pairs in John Fox''s car library e.g.:
> pairs(cbind(prestige, income, education, women))
Error in text.default(x, y, txt, cex = cex, font = font) :
X11 font at size 16 could not be loaded
In addition: Warning message:
freeing previous text buffer in GText
>
Evidently
2006 Jun 20
2
glm beta hypothesis testing
In summary.glm I'm trying to get a better feel for the z output. The
following lines can be found in the function
1 if (p > 0) {
2 p1 <- 1:p
3 Qr <- object$qr
4 coef.p <- object$coefficients[Qr$pivot[p1]]
5 covmat.unscaled <- chol2inv(Qr$qr[p1, p1, drop = FALSE])
6 dimnames(covmat.unscaled) <- list(names(coef.p), names(coef.p))
2006 Dec 17
2
X11 fonts and Ubuntu
Hi,
I am moving from Windows XP to Ubuntu 6.10 and installed R 2.4.0. When I
run eg plot.lm (things work fine with plot.default - eg
plot(rnorm(30),rnorm(30)))
plot(lmobject)
I can get the first plot and then this message:
Hit <Return> to see next plot:
Error in text.default(x, y, labels.id[ind],cex=cex, xpd=TRUE, :
could not find any X11 fonts
Check that the Font Path is correct
2003 Dec 09
2
Font problem
Some plots fail due to a problem with the X11 fonts. I get a message that
"X11 font at size 22 could not be loaded." The demo() graphics routine for
instance dies during the third chart. The graphics demo calls "font.main=1"
and that seems to be where the error is. I believe this is due to a
configuration problem on my system, however I can't find where in the
2005 Mar 21
2
X11 Fonts sizes
In postscript graphs (pointsize = 10, different sizes in graph adjusted via
cex) I would like to use different font sizes but get the following warning
message:
Warning messages:
1: X11 used font size 8 when 9 was requested
2: X11 used font size 8 when 7 was requested
3: X11 used font size 8 when 5 was requested
This is probably not a R but a X11 problem, nevertheless I would be most
1998 May 29
0
aov design questions
R developers,
I have a first attempt to make an aov function. Eventually I want to
build in Error() structure, but first I am trying to get this
presentable for balanced data with only a single stratum, just using
residual error. I am following R. M. Heiberger's Computation for the
Analysis of Designed Experiments, Wiley (1989)
I a using a wrapper (aov.bal) to call the
2012 Mar 14
1
How to use a saved SVM model from e1071
Hello,
I have an SVM model previously calibrated using libsvm R implementation from
the e1071 package.
I would like to use this SVM to predict values, from a Java program.
I first tried to use jlibsvm and the "standard" java implementation of
libsvm, without success.
Thus, I am now considering writing data in files from my Java code, calling
an R program to predict values, then gather
2007 Sep 12
2
Font problem (PR#9906)
Full_Name: M. Mu?oz M?rquez
Version: 2.3.1
OS: Ubuntu
Submission from: (NULL) (150.214.231.66)
Here is the reply to the edit command using gnome
> edit(data.frame())
Erro en dataentry(datalist, modes) : invalid device
Adem?s: Warning message:
unable to create fontset -*-fixed-medium-r-normal--13-*-*-*-*-*-*-*
> Sys.getlocale()
[1]
2018 Jun 06
2
[RFC][SVE] Supporting SIMD instruction sets with variable vector lengths
Hi David,
>>> The name "getSizeExpressionInBits" makes me think that a Value
>>> expression will be returned (something like a ConstantExpr that uses
>>> vscale). I would be surprised to get a pair of integers back. Do
>>> clients actually need constant integer values or would a ConstantExpr
>>> sufffice? We could add a ConstantVScale or
2006 Nov 02
1
Res: graphics not find source
In ubuntu 6,06 the R normally run, but latter to install the a vesion
6,10 plot this not appearing.
computer with problem:
/usr/share/X11/fonts$ ls
misc Type1 X11R7
In computer OK:
/usr/share/X11/fonts$ls
100dpi(*) 75dpi encodings fonts.cache-1 misc Type1
----- Mensagem original ----
De: Peter Dalgaard <p.dalgaard@biostat.ku.dk>
Para: Ricardo Arias Brito
2009 Apr 05
4
extract the p value of F statistics from the lm class
Dear R users
I have run an regression and want to extract the p value of the F
statistics, but I can find a way to do that.
x<-summary(lm(log(RV2)~log(IV.m),data=b))
Call:
lm(formula = log(RV2) ~ log(IV.m), data = b[[11]])
Residuals:
Min 1Q Median 3Q Max
-0.26511 -0.09718 -0.01326 0.11095 0.29777
Coefficients:
Estimate Std. Error t value Pr(>|t|)
1999 Dec 26
3
coredump with plot(x,y,pch="+",cex=2.2) (PR#389)
Core dumped when plot() is used with pch="c" & cex > 2, e.g.,
plot(1,1, pch="+", cex=2.2)
Thank you and best wishes for 2000!
Rashid Nassar
--please do not edit the information below--
Version:
platform = i586-unknown-linux
arch = i586
os = linux
system = i586, linux
status =
major = 0
minor = 90.1
year = 1999
month = December
day = 15
language = R
2006 Jun 26
0
X11 font troubles (Knoppix/Debian unstable)
I'm getting
Error in strwidth(...) : X11 font at size 15 could not be loaded
kinds of errors when I try to change cex to something *other*
than 1 (works OK otherwise).
I can't get through to RSiteSearch() right now, but as I recall
my search of it only revealed people who had problems because they
had failed to install fonts: my Knoppix/tracking Debian unstable
distribution claims
2007 Nov 21
0
Vanishing Font Path
platform i686-pc-linux-gnu
arch i686
os linux-gnu
system i686, linux-gnu
status
major 2
minor 6.0
year 2007
month 10
day