Displaying 20 results from an estimated 644 matches for "t0".
2006 May 24
1
problem-nlme
...ich were entered by me.
Unfortunately for no it was arrived at the
convergence, several error messages appeared.
I am going to display the growth functions so as they
were entered and a "nlme" call example:
# differents growth function
#vonBertlalanffy
vonBert<- function(x, Linf, K, t0)
Linf*(1-exp(-K*(x-t0)))
size ~ vonBert(age, Linf, K,t0)
vonBert <-deriv(~ Linf*(1-exp(-K*(x-t0))),
c("Linf","K","t0"),function(x,Linf,K,t0){})
vonBertInit <- function(mCall, LHS, data)
{
xy <- sortedXyData(mCall[["x"]], LHS, data)
L...
2009 Oct 15
0
Setting random effects within a category using nlme
...o
main factors using nlme. Within the dataset there are two Type categories and
four Tissue categories, thus giving me 8 datasets in total. The dataset is
in a groupedData object with
formula= Count ~ Time|Type/Tissue
and there are three basic model parameters that I am trying to fit: T0, aN,
and aL.
Calling nlsList gives
------------------------------------------
>nlsList(Count ~ quad.PBMC.model(aL, aN, T0), data = tissueData, start =
list(T0 = 1000, aN = exp(-2), aL = exp(-2)))
Call:
Model: Count ~ quad.PBMC.model(aL, aN, T0) | Type/Tissue
Data: tissueData
Coefficie...
2009 Oct 17
1
custom selfStart model works with getInitial but not nls
...ver, if I try
usint it with nls or nlsList, these routines complain about a lack of initial
conditions.
If someone could point out what I'm doing wrong, I'd greatly appreciate it.
Details:
## Nonlinear model I want to fit to the data
const.PBMC.tcell.model <- function(B0, t, aL, aN, T0){
Tb0 = B0;
x = exp(-log(aL) + log(T0*aL+(-1+exp(t * aL))*Tb0 * aN) - t * aL);
return(x);
}
##Define selfStart routine
const.PBMC.tcell.selfStart<- function(mCall, LHS, data){
t0 = 0;
t1 = 24;
t2 = 48;
##Get B0 Value
B0 = data[1, "B0"];
T0 = mean(dat...
2016 Aug 02
2
Instruction selection problems due to SelectionDAGBuilder
...undef, <8 x i32>
zeroinitializer
%induction58 = add <8 x i64> %.splat57, <i64 0, i64 -1, i64 -2, i64 -3, i64 -4, i64
-5, i64 -6, i64 -7>
br label %vector.body25
The exact problem reported is:
Selecting: t51: v8i64,ch = load<LD64[ConstantPool]> t0, ConstantPool:i64<<8 x
i64> <i64 0, i64 1, i64 2, i64 3, i64 4, i64 5, i64 6, i64 7>> 0, undef:i64
ISEL: Starting pattern match on root node: t51: v8i64,ch =
load<LD64[ConstantPool]> t0, ConstantPool:i64<<8 x i64> <i64 0, i64 1, i64 2, i64 3, i64
4, i...
2015 Nov 21
2
[lld] R_MIPS_HI16 / R_MIPS_LO16 calculation
...9;t seem to
> me that you really have to search and pair up HI16 and LO16 relocations.
It is a question what the ABI authors did mean by the "R_MIPS_HI16
must have an associated R_MIPS_LO16 entry immediately following it"
phrase. In fact you can get from a compiler this code:
lui $t0,%hi(sym1+4) # R_MIPS_HI16
lui $t0,%hi(sym1+8) # R_MIPS_HI16
lui $t0,%hi(sym1+12) # R_MIPS_HI16
addi $t0,$t0,%lo(sym1+16) # R_MIPS_LO16
and even such code:
lui $t0,%hi(sym1) # R_MIPS_HI16 on sym1
lui $t0,%hi(sym2) # R_MIPS_HI16 on sym2
addi $t0,$t0,%lo(sym1) #...
2017 Jul 20
3
Issue with DAG legalization of brcond, setcc, xor
Hi,
I am having some issues with how some of the instructions are being
legalized.
So this is my intial basic block. The area of concern is the last three
instructions. I will pick and choose debug output to keep this small.
SelectionDAG has 36 nodes:
t0: ch = EntryToken
t6: i32,ch = CopyFromReg t0, Register:i32 %vreg507
t2: i32,ch = CopyFromReg t0, Register:i32 %vreg17
t4: i32 = or t2, Constant:i32<256>
t9: i32 = shl t4, Constant:i32<2>
t10: i32 = add t6, t9
t12: i32,ch = Co...
2011 Sep 22
7
need help on melt/cast
Hello,
I need to convert dataframe from:
ID T0 T1 T2
A 1 2 3
B 4 5 6
C 7 8 9
to:
ID Variable Value
A T0 1
A T1 2
A T2 3
B T0 4
B T1 5
B T2 6
C T0 7
C T1 8
C T2 9
i tried to use melt cast but it give...
2011 Dec 08
0
Fit initial time with modFit and modCost
Hello,
I would like to use modFit and modCost from the package FME to find
the optimal initial time t0 of a process. For simplicity, the process
is either "off" (value 0) or "on" (value h). So I have a data vector
with some zeros followed by some h's, e.g.
> c(0,0,0,2,2,2,2,2,2,2)
[1] 0 0 0 2 2 2 2 2 2 2
(hence h=2 here). I want to find the best guess for the initial ti...
2017 Jul 21
4
Issue with DAG legalization of brcond, setcc, xor
...having some issues with how some of the instructions are being
>> legalized.
>> So this is my intial basic block. The area of concern is the last three
>> instructions. I will pick and choose debug output to keep this small.
>>
>> SelectionDAG has 36 nodes:
>> t0: ch = EntryToken
>> t6: i32,ch = CopyFromReg t0, Register:i32 %vreg507
>> t2: i32,ch = CopyFromReg t0, Register:i32 %vreg17
>> t4: i32 = or t2, Constant:i32<256>
>> t9: i32 = shl t4, Constant:i32<2>
>> t...
2017 Feb 14
2
Ensuring chain dependencies with expansion to libcalls
...s, so we rely on
library calls for certain operations (like sdiv). We recently ran into a
problem where these operations that are expanded to library calls aren't
maintaining the proper ordering in relation to other chains in the DAG.
The following snippet of a DAG demonstrates the problem.
t0: ch = EntryToken
t2: i64,ch,glue = CopyFromReg t0, Register:i64 %reg0
t4: i64,ch,glue = CopyFromReg t2:1, Register:i64 %reg1, t2:1
t6: i64,ch,glue = CopyFromReg t4:1, Register:i64 %reg2, t4:1
t8: i64,ch,glue = CopyFromReg t6:1, Register:i64 %reg3, t6:1
t11: ch = CopyToReg t0, Regist...
2020 Feb 07
2
Why does FPBinOp(X, undef) -> NaN?
On Fri, Feb 7, 2020 at 12:29 PM Nuno Lopes <nunoplopes at sapo.pt> wrote:
>
> It's not correct (output of Alive2):
>
> define half @fn(half %a) {
> %b = fadd half %a, undef
> ret half %b
> }
> =>
> define half @fn(half %a) {
> ret half undef
> }
> Transformation doesn't verify!
> ERROR: Value mismatch
>
> Example:
> half %a
2010 Sep 17
7
removing specific rows from array
...ecause c2 and c3 are same as r2 with c2 and c3 swapped
r6 because c2 and c3 are same as r4 with c2 and c3 swapped
r9 because c2 and c3 are same as r7 with c2 and c3 swapped
r11 because c2 and c3 are same as r8 with c2 and c3 swapped
.
.
.
Any suggestions?
Thanks
Jim
> treats <- c("t0","t1","t2","t3")
> (combs1 <- permutations(length(treats),3,treats))
[,1] [,2] [,3]
[1,] "t0" "t1" "t2"
[2,] "t0" "t1" "t3"
[3,] "t0" "t2" "t1"
[4,] "t0...
2009 Nov 12
0
writing selfStart models that can deal with treatment effects
Hello,
I'm trying to do some non-linear regression with 2 cell types and 4 tissue
type treatments using selfStart models
Following Ritz and Streibig (2009), I wrote the following routines:
##Selfstart
expDecayAndConstantInflowModel <- function(Tb0, time, aL, aN, T0){
exp(-time*aL)*(T0*aL+(-1+exp(time * aL))*Tb0 * aN)/aL
}
expDecayAndConstantInflowModelInit <- function(mCall, LHS, data){
print(paste("SelfStart mCall:", mCall));
print(attributes(mCall));
print(mCall[["aN"]]);
xy <- sortedXyData(mCall[["time"]...
2016 Nov 03
2
rotl: undocumented LLVM instruction?
Is there any way to get it to delay this optimization where it goes from
this:
Initial selection DAG: BB#0 'bclr64:entry'
SelectionDAG has 14 nodes:
t0: ch = EntryToken
t2: i64,ch = CopyFromReg t0, Register:i64 %vreg0
t4: i64,ch = CopyFromReg t0, Register:i64 %vreg1
t6: i64 = sub t4, Constant:i64<1>
t7: i64 = shl Constant:i64<1>, t6
t9: i64 = xor t7, Constant:i64<-1>
t10: i64 = and t2...
2016 Nov 03
3
rotl: undocumented LLVM instruction?
...ov 3, 2016 at 2:07 PM, Phil Tomson <phil.a.tomson at gmail.com>
> wrote:
>
>> Is there any way to get it to delay this optimization where it goes from
>> this:
>>
>> Initial selection DAG: BB#0 'bclr64:entry'
>> SelectionDAG has 14 nodes:
>> t0: ch = EntryToken
>> t2: i64,ch = CopyFromReg t0, Register:i64 %vreg0
>> t4: i64,ch = CopyFromReg t0, Register:i64 %vreg1
>> t6: i64 = sub t4, Constant:i64<1>
>> t7: i64 = shl Constant:i64<1>, t6
>> t9: i64 = xor t7,...
2001 Dec 14
1
nls fit to exponential decay with unknown time origin
I'm trying to use nls() to fit an exponential decay with an unknown offset
in the time (independent variable). (Perhaps this is inherently very
difficult?).
> decay.pl <- nls (amp ~ expn(b0,b1,tau,t0,t), data = decay,
+ start = c(b0=1, b1=7.5, tau=3.5, t0=0.1), trace=T)
Error in nlsModel(formula, mf, start) : singular gradient matrix at
initial parameter estimates
>
> expn(1, 7.5, 3.5, 0.1, decay$t)
[1] 6.636080 5.259657 4.164661 2.797383 1.760584 1.250300
attr(,"gr...
2010 Aug 12
1
Need help to understand integrate function
Hi,
I'm running into a wall when trying to use the integrate function. I
have the following setting:
powerLaw2 <- function(x,l1,l2,c0,t0) {
idx <- which(x <= 0);
if (length(idx) > 0) {
x[idx] <- 0;
}
xl <- (-l1+l2)*log(x/t0);
L <- log(c0)-l1*log(x)-log(1+exp(xl));
L <- exp(L);
return(L);
}
plCDF2 <- function(x,l1,l2,c0,t0) {
print(c(l1,l2,c0,t0));
cdf <- integrate(f=pow...
2011 Oct 20
1
Applying function with separate dataframe (calibration file) supplying some inputs
...anism, such as an oyster, consumes the oxygen. Each vial is
calibrated before the experiment and these calibrations are used to convert
the raw data after the experiment into oxygen values. I end up with two
dataframes. One has the calibration data and for example could look like
this
vial cal0 T0 cal100 T100
1 61 18 28 18
2 60.8 18 27.1 18
3 60.2 18 28.3 18
4 59.8 18 27.2 18
The second is a data file which could look like this
vial phase temp time
1 31 17.5 10
1 31.5 17.4 20
1...
2007 Apr 11
5
how to reverse a list
Hi, there:
I am wondering if there is a quick way to "reverse" a list like this:
t0 <- list(a=1, b=1, c=2, d=1)
reverst t0 to t1
> t1
$`1`
[1] "a" "b" "d"
$`2`
[1] "c"
thanks.
--
Weiwei Shi, Ph.D
Research Scientist
GeneGO, Inc.
"Did you always know?"
"No, I did not. But I believed..."
---Matrix III
2016 Nov 02
3
rotl: undocumented LLVM instruction?
...bclr r1, r0, r1, 64
%sub = sub i64 %b, 1
%shl = shl i64 1, %sub
%xor = xor i64 %shl, -1
%and = and i64 %a, %xor
ret i64 %and
}
I ran llc with -debug to get a better idea of what's going on and found:
Initial selection DAG: BB#0 'bclr64:entry'
SelectionDAG has 14 nodes:
t0: ch = EntryToken
t2: i64,ch = CopyFromReg t0, Register:i64 %vreg0
t4: i64,ch = CopyFromReg t0, Register:i64 %vreg1
t6: i64 = sub t4, Constant:i64<1>
t7: i64 = shl Constant:i64<1>, t6
t9: i64 = xor t7, Constant:i64<-1>
t10: i64 = and t2...