Displaying 20 results from an estimated 10000 matches similar to: "read.table reads "i" as NA_complex_"
2015 Oct 07
0
read.table reads "i" as NA_complex_
This is fixed/changed in r-devel:
> str(type.convert("i"))
 Factor w/ 1 level "i": 1
It was reported on July 18 as PR#16473, if you care.
(Funny how an obscure issue goes unnoticed for a decade, then pops up twice independently within a few months. A property of the Poisson process, I suppose.)
> On 07 Oct 2015, at 22:22 , William Dunlap <wdunlap at tibco.com>
2006 Sep 01
1
integration problem with gamma function
Dear R-list members,
I have a problem with translating a mathematica script into R. The whole 
script is at the end of the email (with initial values for easy 
reproduction) and can be pasted directly into R. The problematic part 
(which is included below of course) is
<--- Original Mathematica --->
(* p_svbar *)
UiA  = Ni (Dsi - 2Di A + A^2)/2;
UiiA = Nii (Dsii - 2Dii A + A^2)/2;
psvbar =
2012 Nov 09
4
as.data.frame(do.call(rbind,lapply)) produces something weird
The following code:
--8<---------------cut here---------------start------------->8---
> myfun <- function (x) list(x=x,y=x*x)
> z <- as.data.frame(do.call(rbind,lapply(1:3,function(x) c(a=paste("a",x,sep=""),as.list(unlist(list(b=myfun(x),c=myfun(x*x*x))))))))
> z
   a b.x b.y c.x c.y
1 a1   1   1   1   1
2 a2   2   4   8  64
3 a3   3   9  27 729
2010 Mar 31
2
Should as.complex(NaN) -> NA?
I'm having trouble grokking complex NaN's.
This first set examples using complex(re=NaN,im=NaN)
give what I expect
  > Re(complex(re=NaN, im=NaN))
  [1] NaN
  > Im(complex(re=NaN, im=NaN))
  [1] NaN
  > Arg(complex(re=NaN, im=NaN))
  [1] NaN
  > Mod(complex(re=NaN, im=NaN))
  [1] NaN
  > abs(complex(re=NaN, im=NaN))
  [1] NaN
and so do the following
  > Re(complex(re=1,
2018 Feb 24
3
include
On 24/02/2018 1:53 PM, William Dunlap via R-help wrote:
>     x1 =  rbind(unique(preval),mydat)
>    x2 <- x1[is.na(x1)] <- 0
>    x2  # gives 0
> 
> Why introduce the 'x2'?   x1[...] <- 0 alters x1 in place and I think that
> altered x1 is what you want.
> 
> You asked why x2 was zero.  The value of the expression
>     f(a) <- b
> and assignments
2023 Apr 14
1
Possible inconsistency between `as.complex(NA_real_)` and the docs
Hi all,
Surprisingly (at least to me), `as.complex(NA_real_)` results in
`complex(real = NA_real_, imaginary = 0)` rather than `NA_complex_`.
It seems to me that this goes against the docs of `as.complex()`,
which say this in the Details section:
"Up to R versions 3.2.x, all forms of NA and NaN were coerced to a
complex NA, i.e., the NA_complex_ constant, for which both the real
and
2009 Jun 03
1
Print bug for matrix(list(NA_complex_, ...))
In R 2.8.0 on Windows (tested both under ESS and under R Console in case
there was an I/O issue)
There is a bug in printing val <- matrix(list(NA_complex_,NA_complex_),1).
> dput(val)
structure(list(NA_complex_, NA_complex_), .Dim = 1:2)
> print(val)
[,1]
[1,]
[,2]
[1,]
Note that a large number of spaces are printed instead of NA.  Compare the
unproblematic real case:
2015 Oct 16
1
[RFC V3 7/8] armv7, armv8: Optimize fixed point fft using NE10 library
Hi Timothy,
Sorry for late reply. I have upstreamed the patch to fix the regression here:
  https://github.com/projectNe10/Ne10/commit/ee5d856cd9cb8c4a15ace567df4239f4e788d043
I have tested it with Vish's branch:
  http://git.linaro.org/people/viswanath.puttagunta/opus.git/shortlog/refs/heads/rfcv3_fft_fixed)
Both unit test dft and unit test mdct passed on ARM v7/v8, floating point/fixed
2007 Dec 13
4
Weird Mongrel error: Not starting.
Hi list,
I have a problem with Mongrel which is really bugging me. I would really
appreciate any help that anyone can provide to help me in solving this
problem.
1. My setup:
Apache front_end with mod_proxy_balancer in front of 4 mongrel/rails
instances of my application.
Rails 1.2.5
Ruby 1.8.6
Mongrel 1.1.1
2. I noticed that the CPU consumption on my server was 100% being consumed
by ruby so I
2011 Sep 23
2
Issue with seek() on gzipped connections in R-devel
Dear all,
In R-devel (2011-09-23 r57050), I'm running into a serious problem
with seek()ing on connections opened with gzfile(). A warning is
generated and the file position does not seek to the requested
location. It doesn't seem to occur all the time - I tried to create a
small example file to illustrate it, but the problem didn't occur.
However, it can be seen with a file I use for
2016 May 09
2
Replacing an instruction in a post-RA pass
I'm writing a pass that looks at the operands of certain non-commutable
instructions and swaps a couple of them if certain conditions exist (a
register bank conflict in the instruction). If the conflict exists, I build
a new instruction which has the 2nd and 3rd operands swapped (using
BuildMI).  Then I want to get rid of the original instruction. I had done
some searching and found that
2007 Dec 11
2
Mongrel not starting: `initialize_without_backlog'': Cannot assign requested address - bind(2) (Errno::EADDRNOTAVAIL)
Hi
I have a rather strange problem with mongrel and I would be grateful if
anyone could assist me with resolving.
I have an application running mongrel 1.1.1 and rails 1.2.5 with ruby 1.8.6.
It was all working fine and starting as expected. But I did a server reboot
once and mongrel has refused to start up since. I get the following error:
2008 Jun 03
3
matlab eigs function in R
Hello
Does anybody know how one can compute d largest eigenvalues/eigenvectors in
R, like in MATLAB eigs function ? eigen function computes all
eigenvectors/eigenvalues, and they are slightly different than those
generated by matlab eigs. 
Thanks in advance
-- 
View this message in context: http://www.nabble.com/matlab-eigs-function-in-R-tp17619641p17619641.html
Sent from the R help mailing list
2007 Jun 18
1
Problem with binding data-frames
Hello,
I'm having a problem concerning r-binding datasets.
I have six datasets, from six different plates, and two different days.
I want to combine these datasets together for analysis. Datasets from
day 2, have all the same columns than datasets from day 1. However in
addition, there are few columns more in day 2. Thus, using rbind for
this, results a error, because the objects are not the
2016 Oct 04
2
error handling in strcapture
I noticed a problem in the strcapture from R-devel (2016-09-27 r71386),
when the text contains a missing value and perl=TRUE.
{
      # NA in text input should map to row of NA's in output, without
warning
      r9p <- strcapture(perl = TRUE, "(.).* ([[:digit:]]+)", c("One 1", NA,
"Fifty 50"), data.frame(Initial=factor(), Number=numeric()))
      e9p <-
2013 May 18
2
Intervalos de confianza en una autocorreloción
Hola:
¿Existe alguna forma de obtener el valor numérico de los intervalos de 
confianza en una autocorrelación?
O, por el contrario, ¿tengo que calcularlos «a mano»?
(Llevo ya un rato buscando y nada.)
Gracias por adelantado.
Salud y Revolución.
Lobo.
-- 
Libertad es poder elegir en cualquier momento. Ahora yo elijo GNU/Linux,
para no atar mis manos con las cadenas del soft propietario.
2017 Dec 29
3
winbuilder warning message wrt function pointers
I've recently updated the coxme package, which calls internal routines from the bdsmatrix 
package.? (It is in fact mentioned as an example of this in the Extensions manual.)
The call connections are a blocks like this, one for each of the 9 called C routines.
void bdsmatrix_prod4(int nrow,??? int nblock,?? int *bsize,
 ??????????????????? double *bmat, double *rmat,
 ??????????????????? int
2017 Oct 09
1
Regular expression help
"(^| +)([^/ ]*/?){0,2}", with the first "*" replaced by "+" would be a bit
better.
Bill Dunlap
TIBCO Software
wdunlap tibco.com
On Mon, Oct 9, 2017 at 8:50 AM, William Dunlap <wdunlap at tibco.com> wrote:
> > x <- "f 147/1315/587 2820/1320/587 3624/1321/587 1852/1322/587"
> > gsub("(^| *)([^/ ]*/?){0,2}", "\\1", x)
2015 Mar 30
3
Segfault with match()
This is admittedly a contrived example, but...
data(housing, package ="MASS")
x <- housing$Type + housing$Sat
match(x, unique(x))
Hadley
-- 
http://had.co.nz/
2016 Oct 04
1
error handling in strcapture
It is also not catching the cases where the number of capture expressions
does not match the number of entries in proto.  I think all of the
following should give an error about the mismatch.
> strcapture("(.)(.)", c("ab", "cde", "fgh", "ij", "lm"),
proto=list(A="",B="",C=""))
   A  B  C
1  a  b cd
2  d