Displaying 20 results from an estimated 44 matches for "int2".
Did you mean:
int
2015 Sep 10
3
[OpenCL] Implicit arithmetic conversion of INT_MIN to int vector type
Hello,
I recently came across an OpenCL kernel in which an int vector type was subtracted from the INT_MIN constant, e.g.
int2 v2 = INT_MIN - (int2)(0);
INT_MIN was defined as
#define INT_MIN (-2147483648)
Clang in OpenCL modes (-x cl) produces the following error:
vector_conversion.c:12:42: error: can't convert between vector values of different size ('long' and 'int2' (vector of 2 'int' va...
2005 Aug 09
4
Too slow computer?
Hello! I''ve put some questions on this list some weeks
ago and I''ve got good answers. Thank you!
Now I''ve finished my (beautyful) script and I ran it
on my router...
About my script:
It routes packages based on their destination on the
Internet. I have about 1650 preffered destination
networks listed in some file. The script read this
file and marks every package for
2012 Nov 30
3
loop function and integrate?
...= numeric(ib)
b = numeric(ib)
for(j in 1:ia) {
H = function(x) {sin(x + a[j])}
for(i in 1:ib) {
int = integrate(H, lower = 0, upper = x[i])
int1[i] = int[1]
b[i] = 1 + a[i]
}
end
int1 = unlist(int1)
int2 = int1*b
ss[j] = sum(int2)
}
end
if i try this code without the for loop it's ok, but when i put the for on,
i get all sort of errors...
Thank you for your help :)
--
View this message in context: http://r.789695.n4.nabble.com/loop-function-and-integrate-tp4651436.html
Sent from th...
2008 Dec 18
1
Indicator function for merged times (was: Re: Rr: For and if confusion)
Please start a new thread for a new topic and use a
meaningful subject for sake of the archives and
everyone trying to follow.
Using your Int1, correcting your Int2 and using your
Y (which goes to Jul not Aug as per the comment):
library(zoo)
> as.ts(with(merge.zoo(Int1, Int2, Y, fill = 0), pmax(Int1, Int2)))
Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec
1992 0 0 0 0 0
1993 0 0 1 1 1 1 1 1 1...
2013 Dec 20
3
[LLVMdev] Switch instruction optimization
Hello there,
I have a high level code which would look like that in C++:
enum E { A, B, C };
E int2e(long i) {
switch(i) {
case 0: return A;
case 1: return B;
case 2: return C;
default: return A;
}
}
It is compiled to this IR with O3 optimization:
define i64 @int2e(i64 %i_arg) #0 {
entry:
switch i64 %i_arg, label %label_case1 [
i64 2, label %label_c...
2009 Feb 12
0
[LLVMdev] Eliminate PHI for non-copyable registers
On Feb 11, 2009, at 4:07 AM, Alex wrote:
> In my hardware there are two special registers cannot be copied but
> can only be assigned and referenced (read) in the other instruction.
> They are allocatable also.
>
> br i1 %if_cond, label %then, label %else
> then:
> %x1 = fptosi float %y1 to i32
> br label %endif
> else:
> %x2 = fptosi float %y2 to i32
>
2009 Feb 12
2
[LLVMdev] Eliminate PHI for non-copyable registers
...e implements the same number
of these i32 registers as the "specification". The input language (which is
converted to LLVM IR) may use up to 4 registers but the hardware only has 2.
So they must be allocatable, right?
For example, the input uses up to 3 <i32> registers INT0, INT1, INT2 (Rx are
FP registers):
fp2int INT0, R0
fp2int INT1, R1
fp2int INT2, R2
add R0, R0, R[INT1+1]
mul R0, R[INT2+2], R[INT0+1]
Since the hardware doesn't has INT2, the final machine should be like:
fp2int INT0, R0
fp2int INT1, R1
add R0, R0, R[INT1+1]
fp2int INT1, R2 <==== re...
2020 Jul 02
3
Redundant ptrtoint/inttoptr instructions
Hi all,
We noticed a lot of unnecessary ptrtoint instructions that stand in way of
some of our optimizations; the code pattern looks like this:
bb1:
%int1 = ptrtoint %struct.s* %ptr1 to i64
bb2:
%int2 = ptrtoint %struct.s* %ptr2 to i64
%bb3:
%phi.node = phi i64 [ %int1, %bb1 ], [%int2, %bb2 ]
%ptr = inttoptr i64 %phi.node to %struct.s*
In short, the pattern above arises due to:
1. InstCombine introducing a bitcast while performing a canonicalization in
combineLoadToOperationType() [1]
2. G...
2009 Feb 11
2
[LLVMdev] Eliminate PHI for non-copyable registers
In my hardware there are two special registers cannot be copied but can only
be assigned and referenced (read) in the other instruction. They are
allocatable also.
br i1 %if_cond, label %then, label %else
then:
%x1 = fptosi float %y1 to i32
br label %endif
else:
%x2 = fptosi float %y2 to i32
br label %endif
endif:
%x3 = phi i32 [%x1, %then], [%x2, %else]
PNE::LowerAtomiPHINode() fails
2013 Dec 20
0
[LLVMdev] Switch instruction optimization
...wo missed optimization cases here. Even without
the case value forwarding, label_case2 and label_case3 are redundant.
Philip
On 12/20/13 6:33 AM, Pawe? Bylica wrote:
> Hello there,
>
> I have a high level code which would look like that in C++:
>
> enum E { A, B, C };
>
> E int2e(long i) {
> switch(i) {
> case 0: return A;
> case 1: return B;
> case 2: return C;
> default: return A;
> }
> }
>
> It is compiled to this IR with O3 optimization:
>
> define i64 @int2e(i64 %i_arg) #0 {
> entry:
> sw...
2011 Oct 20
1
R code Error : Hybrid Censored Weibull Distribution
...blem with a R-code which calculate Fisher Information
Matrix for Hybrid Censored Weibull Distribution. My problem is that:
when I take weibull(scale=1,shape=2) { i.e shape>1} I got my desired
result but when I take weibull(scale=1,shape=0.5) { i.e shape<1} it gives
error : Error in integrate(int2, lower = 0, upper = t) : the integral is
probably divergent. I could not found any theoretical interpretation of
it. I'm sending the code :
#########################################################################################
f3<-function(t,r){
#calculation for t1
fb1<-function(t,...
2013 Jul 08
2
Re: deadlock on connection loosing
On 07.07.2013 01:53, Александр wrote:
> В письме от Воскресенье, 30-июн-2013 03:41:37 пользователь Александр написал:
>> В письме от Вторник, 25-июн-2013 11:47:10 пользователь Michal Privoznik
....
>
> i have found source of problem, my code looks like this:
>
> int count = virConnectListAllDomains(connection, NULL, 0);
> ....
> domain = virDomainDefineXML(connection,
2005 Jan 18
4
Data Simulation in R
...ction(x) x$coefficient[1])
slo1 <- sapply(glsrun1, function(x) x$coefficient[2])
################
#Clean up workspace
rm(glsrun1)
gc()
glsrun2 <- lapply(long, function(x) gls(score.2~I(time-1), data=x,
correlation=corAR1(form=~1|V1), method='ML'))
# Extract intercepts and slopes
int2 <- sapply(glsrun2, function(x) x$coefficient[1])
slo2 <- sapply(glsrun2, function(x) x$coefficient[2])
#Clean up workspace
rm(glsrun2)
gc()
# Print Results
cat("Original Standard Errors","\n", "Intercept","\t",
sd(int1),"\n","Slope...
2020 Jul 02
3
Redundant ptrtoint/inttoptr instructions
My general feeling is this: No optimizations should be creating
int2ptr/ptr2int. We really need to fix them all. They should use pointer
casts and i8* GEPs. This has, unfortunately, been a problem for a long
time. As Johannes says, optimizing int2ptr/ptr2int is very tricky. In
part, becaue all dependencies, including implicit control dependencies,
end up being p...
2008 Dec 04
0
integration within maximum likelihood
...xp(U1)+exp(U2)+exp(U3))
+ arg1<- function(mu1) {(exp(U1)/Usum)*dnorm(mu1- alfz*y$z_a1 -alfp*y$p1)}
+ arg2<- function(mu2) {(exp(U2)/Usum)*dnorm(mu2- alfz*y$z_a2 -alfp*y$p2)}
+ arg3<- function(mu3) {(exp(U3)/Usum)*dnorm(mu3- alfz*y$z_a3 -alfp*y$p3)}
+ int1<- integrate(arg1,-Inf,Inf)
+ int2<- integrate(arg2,-Inf,Inf)
+ int3<- integrate(arg3,-Inf,Inf)
+ logl<-sum(y$Ch1*int1$value+ y$Ch2*int2$value + y$Ch3*int3$value)
+ return(-logl)
+ }
>
> p<-optim(c(0,0,0,0,0,0,0,0,0),mnl.lik,y=DATA,method="BFGS",hessian=T)
Error in integrate(arg1, -Inf, Inf) :
evaluatio...
2013 Jul 08
0
Re: deadlock on connection loosing
...derr, " Level: %d\n", err->level);
fprintf(stderr, " str1: %s\n", err->str1);
fprintf(stderr, " str2: %s\n", err->str2);
fprintf(stderr, " str3: %s\n", err->str3);
fprintf(stderr, " int1: %d\n", err->int1);
fprintf(stderr, " int2: %d\n", err->int2);
}
int init_libvirt()
{
virSetErrorFunc(NULL, libvirt_error_handler);
libvirt_connection = virConnectOpen("qemu:///system");
.....
i will also check virConnectListAllDomains with correct pointer instead of
null later, now have some other work to do.
2008 Feb 05
2
How to generate table output of t-test
Hi,
Given
test <- matrix(c(1, 1,2,2), 2,2)
t <- apply(test, 1, t.test)
How can I obtain a table of p-values, confidence interval etc, instead of
[[1]]
One Sample t-test
data: newX[, i]
t = 3, df = 1, p-value = 0.2048
alternative hypothesis: true mean is not equal to 0
95 percent confidence interval:
-4.853102 7.853102
sample estimates:
mean of x
1.5
[[2]]
2013 Feb 07
0
There seems a deadlock in libvirt
...ret = 0x7f6998000c20 ""
rv = -1
i = <optimized out>
arg = 0x7f6998027950 "\360e\n\230i\177"
dispatcher = 0x73de40
rerr = {code = 0, domain = 0, message = 0x0, level = 0, dom = 0x0,
str1 = 0x0, str2 = 0x0, str3 = 0x0, int1 = 0, int2 = 0, net = 0x0}
#10 virNetServerProgramDispatch (prog=0x15825d0, server=0x1577c90,
client=0x157e730, msg=0x1689cc0) at rpc/virnetserverprogram.c:289
ret = -1
rerr = {code = 0, domain = 0, message = 0x0, level = 0, dom = 0x0,
str1 = 0x0, str2 = 0x0, str3 = 0x0, int1 = 0, int2 = 0, ne...
2009 Dec 17
1
Problem reading binaries created with fortran (More infos)
The structure of the file is clear (see below) the first line is made of
integers and doubles with the fifth being a text string followed by arrays
of double precision number.:
int1 int2 double1 double2 text int3 int4 int5
(array of double)
here is an example of file:
1 1 1.0 1.0 "HEAD" 160 224 3
23.4 34.5 ......
I tried to read the first line with readBin (results are copied below):
> zz <- file("heads.hds", "rb")
> readBin(zz,what="...
2013 Dec 05
1
Using Java bindings to event callback
...message:
libvirt: Remote Driver error : adding cb to list
exception caught:org.libvirt.LibvirtException: adding cb to list
level:VIR_ERR_ERROR
code:VIR_ERR_RPC
domain:VIR_FROM_REMOTE
hasConn:false
hasDom:false
hasNet:false
message:adding cb to list
str1:%s
str2:adding cb to list
str3:null
int1:-1
int2:-1
By the way I also trace the mail list
*[libvirt] [PATCH] Java bindings for domain events* (2008 Nov 07)
*[libvirt] [PATCH 1/2] Java bindings for domain events**[libvirt]
[PATCH 2/2] Java bindings for domain events* (2008 Nov 18) --> Reject
patch*Re: [libvirt] [PATCH 1/2] Java bindings for d...