Displaying 20 results from an estimated 254 matches for "m0".
Did you mean:
md0
2013 May 19
1
Generate positive definite matrix with constraints
Hi, I have a question for my simulation problem:
I would like to generate a positive (or semi def positive) covariance
matrix, non singular, in wich the spectral decomposition returns me the same
values for all dimensions but differs only in eigenvectors.
Ex.
sigma
[,1] [,2]
[1,] 5.05 4.95
[2,] 4.95 5.05
> eigen(sigma)
$values
[1] 10.0 0.1
$vectors
[,1]
2013 Oct 11
3
[LLVMdev] Generate code for ARM Cortex m0, m3, and m4.
Hi,
I am trying to cross compile code for ARM Cortex m0, m3, and m4.
For m0, I use:
-target armv6--eabi -mcpu=cortex-m0
That seems to work. For m3 and m4, I use the following which does not work
(fatal error: error in backend: CPU: 'cortex-m3' does not support ARM mode):
-target armv7m--eabi -mcpu=cortex-m3
and
-target armv7em--eabi...
2013 Mar 22
1
Trouble embedding functions (e.g., deltaMethod) in other functions
...or, so
it's difficult for me, as a novice functioneer, to figure out what's going
wrong.
Here's my example for deltaMethod():
t <- c(0.00000, 26.24551, 61.78180, 86.88254, 221.75480)
m <- c(48.591707, 15.655895, 12.284635, 5.758547, 0.000000)
dat <- data.frame(t = t, m = m)
m0 <- m[1]
t0 <- t[5]
nlls <- nls(m ~ (m0^(1/lambda) - (t * m0/t0)^(1/lambda))^lambda,
start = list(lambda = 1), data = dat)
xVal <- seq(0, t0, length = 10)
mod.SE <- list()
for(i in 1:length(xVal)){
z <- xVal[i]
mod.SE[[i]] <- deltaMethod(nlls, "(m0^(1/lambda) - (z *...
2018 Oct 02
2
Reordering of load/stores using MemorySSA
...example, we have this following code:
v = load q
store 10, p
=>
store 10, p
v = load q // This is incorrect if p and q may alias
In the MemorySSA representation however,
there's no syntactic dependency between load/store,
because MemorySSA before transformation would look like this:
USE(M0) // corresponding to `v = load q`
M1 = DEF(M0) // corresponding to `store 10, p`
Reordering these two nodes does not break syntactic dependency,
hence additional flow-sensitive analysis is needed to check whether
reordering is valid.
To my understanding, GVNHoist seems to do that:
Memory operation...
2011 Jul 09
3
Confusing piece of R code
m0<-epxression((4*theta1*theta2-theta3^2)/(2*x*theta3^2)-0.5*theta1*x)
params<-all.vars(m0) this reads all the params
from m0 so theta1,2 and 3 correct?
params<-params[-which(params=="x")] checks which params are multiplied
by x?
np<-length(para...
2005 Mar 09
3
problem using uniroot with integrate
...f environments that I'm weak on
and would like to understand better. I would appreciate any
suggestions or solutions that anyone might offer for fixing
my error. Thank you.
dprime.mAFC <- function(Pc, m) {
est.dp <- function(dp, Pc = Pc, m = m) {
pr <- function(x, dpt = dp, m0 = m) {
dnorm(x - dpt) * pnorm(x)^(m0 - 1)
}
Pc - integrate(pr, lower = -Inf, upper = Inf,
dpt = dp, m0 = m)$value
}
dp.res <- uniroot(est.dp, interval = c(0,5), Pc = Pc, m = m)
dp.res$root
}
platform powerpc-apple-darwin6.8
arch powerpc
os...
2013 Oct 12
0
[LLVMdev] Generate code for ARM Cortex m0, m3, and m4.
Hi Jan,
For Cortex-M0, you should probably use the armv6m string in the target
triple. For M3 and M4 you need to use the thumbv7m arch string, -mthumb
won't be necessary.
Amara
On 11 October 2013 19:23, Jan Hoogerbrugge <
jan.hoogerbrugge at biface-tools.com> wrote:
> Hi,
>
> I am trying to cross...
2011 Aug 06
1
How set lm() to don't return NA in summary()?
...lt;- expand.grid(cult=gl(1,3,la=LETTERS[1]), fert=101)
> fat <- expand.grid(cult=gl(2,3,la=LETTERS[2:3]), fert=seq(50,150,50))
> da <- rbind(adi, fat)
> da$y <- da$fert+rnorm(nrow(da),0,10)
>
> # plot
> require(lattice)
> xyplot(y~fert|cult, da)
>
> # adjust
> m0 <- lm(y~cult*fert, da)
> summary(m0)
...
Coefficients: (1 not defined because of singularities)
Estimate Std. Error t value Pr(>|t|)
(Intercept) 7.55401 10.18956 0.741 0.469
cultB -8.04486 13.54672 -0.594 0.561
cultC -3.83644 6.74848 -0.568 0.5...
2008 Aug 20
1
boot0cfg and gmirror ...
Hi, all,
I know about the "foot shooting" prevention in geom(4)
when trying to update the MBR of a mounted disk.
I have a system with ad4 and ad6 mirrored and fdisk
partitions residing on the mirror to be booted alterningly:
hd30# gmirror status
Name Status Components
mirror/m0 COMPLETE ad4
ad6
hd30# mount
/dev/mirror/m0s1a on / (ufs, local, read-only)
devfs on /dev (devfs, local)
/dev/mirror/m0s3a on /etc (ufs, local)
/dev/mirror/m0s3d on /var (ufs, local, soft-updates)
hd30# boot0cfg -v /dev/mirror/m0
# flag start chs type end chs...
2011 Sep 28
1
Wilcox test and data collection
...with values of gg when t1==3
d==2 , compare values of gg when t1==1 with values of gg when t1==3
..
then
d==0 , compare values of gg when t2==1 with values of gg when t2==3
d==1...
then collect the data of a statistics and create a table.
The procedure i followed is to create sub datasets called m0,m1,m2,m3
corresponding
to the values of d, i.e.
m0<- y[y$d==0,c(7,17,18,19)]
m1<- y[y$d==1,c(7,17,18,19)]
m2<- y[y$d==2,c(7,17,18,19)]
m3<- y[y$d==3,c(7,17,18,19)]
then perform the test as follows:
x1<-wilcox.test(m0[m0$t1==1,1],m0[m0$t1==3,1],correct=FALSE, exact=FALSE,
conf.int=...
2011 Nov 29
0
[SOLVED]looking for beta parameters
...I have found the beta.select function in the LearnBayes package, which
> is as follows:
>
> function (quantile1, quantile2)
> {
> betaprior1 = function(K, x, p) {
> m.lo = 0
> m.hi = 1
> flag = 0
> while (flag == 0) {
> m0 = (m.lo + m.hi)/2
> p0 = pbeta(x, K * m0, K * (1 - m0))
> if (p0 < p)
> m.hi = m0
> else m.lo = m0
> if (abs(p0 - p) < 1e-04)
> flag = 1
> }
> return(m0)
> }
>...
2014 Oct 23
2
[LLVMdev] Question regarding getElementPtr/Addressing modes in backend
Hi Steve,
Thanks for the tip regarding MIOperandInfo, I didn't think of that part of
the tablegen description.
Sadly, I did actually mean: r1 = *(i0 += m0).
So increment i0 by m0. Read memory the memory location "pointed" to by i0.
Store in r1. Sadly I am not too familiar with compiler terminology, so I
don't know if there is a proper term for such a load.
On Thu, Oct 23, 2014 at 12:23 PM, Steve Montgomery <
stephen.montgomery3 at...
2012 Jan 11
1
R error in make check
...Testing examples for package ?base?
Error: testing 'base' failed
Execution halted
I looked in <build dir>/test/Examples/base-Ex.Rout.fail and found the foll:
*******EXCERPT *****
...
> ### ------- Pickyness Flags : -----------------------------
...
> ## Don't show:
> m0 <- m <- structure(cbind(I=1, a=1:3), foo = "bar", class = "matrix")
> attributes(m0) <- rev(attributes(m))
> names(attributes(m0)) # 'dim' remains first, interestingly...
[1] "dim" "class" "foo" "dimnames&q...
2014 Oct 21
2
[LLVMdev] Question regarding getElementPtr/Addressing modes in backend
...h the load nodes with:
[(set i24:$val, (load addr:$addr))]
Where addr is a complex pattern. This is fine for the 0th element in the
struct, as there is no offset so the resultant assembly would be (which
works fine):
r0 = *(i0)
The issue I have is with the second load. I need the result to be:
m0 = 4
r1 = *(i0 += m0) (offset is stored in a register(m0), and modifies the
original pointer)
rather than
r1 = *(i0 + 4) (immediate)
(The specific registers numbers don't matter).
I'm not sure how to achieve that. Currently addr gets matched in SelectAddr
in XYZISelDAGToDAG.cpp. It will...
2009 Mar 20
1
CCA - manual selection
Hello,
I am trying to obtain f-values for response (independent) variables from a
CCA performed in vegan package, to see which ones of them have
significative influence in my dependent variables (like the manual selection
in canoco), but I can't find any function (or package) that do such a thing.
The dependents variables are species data, and the independents are
ambiental data.
Than you.
2005 Dec 01
1
Kalman Smoothing - time-variant parameters (sspir)
...uld benefit from the extra
confidence in using the excellent package sspir.
In a one-factor model, If I am trying to do a simple regression where
I assume the intercept is constant and the 'Beta' is changing, how do
I do that? How do i Initialize the filter (i.e. what is appropriate to
set m0, and C0 for the example below)?
The model I want is: y = alpha + beta + err1; beta_(t+1) = beta_t + err2
I thought of the following:
library(mvtnorm) # (1)
library(sspir)
# Let's get some data so we can all try this at home
dfrm <- data.frame(
y =
c(0.02,0.04,-0.03,0.02,...
2013 Oct 12
2
[LLVMdev] Generate code for ARM Cortex m0, m3, and m4.
On 12 October 2013 23:00, Amara Emerson <amara.emerson at gmail.com> wrote:
> Hi Jan,
>
> For Cortex-M0, you should probably use the armv6m string in the target
> triple. For M3 and M4 you need to use the thumbv7m arch string, -mthumb
> won't be necessary.
>
Yes, but I agree with Jim that a bug must be filled.
Jan, would you mind filling a bug?
http://llvm.org/bugs/enter_bug.cgi?produ...
2002 Jul 04
1
doubt about DF in survival model
Hi all,
I have this,
Weibull distribution
n= 1000
> anova(pk.m0)
Df Deviance Resid. Df -2*LL P(>|Chi|)
NULL NA NA 999 1451.31 NA
> anova(pk.m0,pk.m1)
Terms Resid. Df -2*LL Test Df Deviance P(>|Chi|)
1 1 998 1451.310 NA NA NA
2 seed 996 1229.714 2 22...
2015 Mar 05
2
[LLVMdev] A question to LLVM for ARMv6
Hi, all
I want to use LLVM to compile an ARM Cortex-M0 project on windows. Who can send me a sample, including command arguments and introdution about debug process. Thanks a lot.
-Steven
***************************** Legal Disclaimer *****************************
"This email may contain confidential and privileged material for the sole
use of th...
2018 Apr 09
1
llvm-dev Digest, Vol 166, Issue 22
...16 = extract_vector_elt t26, Constant:i32<0> // [a]
t21: v2i16 = extract_subvector t2, Constant:i32<2> //[c d]
t22: i16 = extract_vector_elt t21, Constant:i32<0> // [c]
t25: v2i16 = BUILD_VECTOR t27, t22 // [a c]
t18: ch,glue = CopyToReg t0, Register:v2i16 %m0, t25
t19: ch = RTN t18
t20: ch = RTN_REG_HOLDER t19, Register:v2i16 %m0, t18:1
Creating new node: t28: v2i16 = undef
Creating new node: t29: v2i16 = vector_shuffle<0,0> t26, undef:v2i16
After reduceBuildVecToShuffle
SelectionDAG has 16 nodes:
t0: ch = EntryToken
t2: v4i1...