R中的数值的双精度(64位)表示(符号,指数,有效数)

时间:2018-05-07 15:44:10

标签: r floating-point numeric

R FAQ声明:

  

可以用R的数字类型精确表示的唯一数字是整数和分数,其分母是2的幂。所有其他数字在内部四舍五入到(通常)53二进制数字精度。

R使用IEEE 754双精度浮点数

  • 1位用于签名
  • 11位指数
  • 52位用于尾数(或有效数字)

总计最多64位。

对于数字0.1,R代表

sprintf("%.60f", 0.1)
[1] "0.100000000000000005551115123125782702118158340454101562500000"

Double (IEEE754 Double precision 64-bit)0.1提供了这种二进制表示形式:

00111111 10111001 10011001 10011001 10011001 10011001 10011001 10011010

我们如何在R中获得此表示形式,以及它与我们示例中sprintf给出的输出有何关联?

3 个答案:

答案 0 :(得分:5)

@chux在评论中提出的问题的答案是“是”; R支持%a格式:

sprintf("%a", 0.1)
#> [1] "0x1.999999999999ap-4"

如果要访问基础位模式,则必须将double重新解释为64位整数。对于此任务,可以通过Rcpp使用C ++:

Rcpp::cppFunction('void print_hex(double x) {
    uint64_t y;
    static_assert(sizeof x == sizeof y, "Size does not match!");
    std::memcpy(&y, &x, sizeof y);
    Rcpp::Rcout << std::hex << y << std::endl;
}', plugins = "cpp11", includes = "#include <cstdint>")
print_hex(0.1)
#> 3fb999999999999a

此十六进制表示与您的二进制表示相同。如何得到十进制表示?

  • 第一位为零,因此符号为正
  • 指数为0x3fb,即十进制1019。鉴于exponent bias,这对应于实际指数-4。
  • 尾数为0x1999999999999a×2 ^ -52,包括implicit 1,即2 ^ -52×7,205,759,403,792,794。
  • 总共得到2 ^ -56×7,205,759,403,792,794:

    sprintf("%.60f", 2^-56 * 7205759403792794)
    #> [1] "0.100000000000000005551115123125782702118158340454101562500000"
    

答案 1 :(得分:2)

从十进制到规范化的双精度:

library(BMS)

from10toNdp <- function(my10baseNumber) {
out <- list()

# Handle special cases (0, Inf, -Inf)
if (my10baseNumber %in% c(0,Inf,-Inf)) {
if (my10baseNumber==0)    { out <- "0000000000000000000000000000000000000000000000000000000000000000" }
if (my10baseNumber==Inf)  { out <- "0111111111110000000000000000000000000000000000000000000000000000" }
if (my10baseNumber==-Inf) { out <- "1111111111110000000000000000000000000000000000000000000000000000" }
} else {

signBit <- 0 # assign initial value

from10to2 <- function(deciNumber) {
  binaryVector <- rep(0, 1 + floor(log(deciNumber, 2)))
  while (deciNumber >= 2) {
    theExpo <- floor(log(deciNumber, 2))
    binaryVector[1 + theExpo] <- 1
    deciNumber <- deciNumber - 2^theExpo  }
  binaryVector[1] <- deciNumber %% 2
  paste(rev(binaryVector), collapse = "")}

#Sign bit
if (my10baseNumber<0) { signBit <- 1 
} else { signBit <- 0 }

# Biased Exponent
BiasedExponent <- strsplit(from10to2(as.numeric(substr(sprintf("%a", my10baseNumber), which(strsplit( sprintf("%a", my10baseNumber), "")[[1]]=="p")+1, length( strsplit( sprintf("%a", my10baseNumber), "")[[1]]))) + 1023), "")[[1]] 
BiasedExponent <- paste(BiasedExponent, collapse='')
if (nchar(BiasedExponent)<11) {BiasedExponent <-  paste(c(  rep(0,11-nchar(BiasedExponent)), BiasedExponent),collapse='')    }

# Significand
significand <- BMS::hex2bin(substr( sprintf("%a", my10baseNumber) , which(strsplit( sprintf("%a", my10baseNumber), "")[[1]]=="x")+3, which(strsplit( sprintf("%a", my10baseNumber), "")[[1]]=="p")-1))

significand <- paste(significand, collapse='')
if (nchar(significand)<52) {significand <-  paste(c( significand,rep(0,52-nchar(significand))),collapse='')    }

out <- paste(c(signBit, BiasedExponent, significand), collapse='')
}

out
}

因此

from10toNdp(0.1)
# "0011111110111001100110011001100110011001100110011001100110011010"

答案 2 :(得分:1)

0.3为例。在R控制台中运行

> sprintf("%a", 0.3)
[1] "0x1.3333333333333p-2"

尾数或重要

二进制的十六进制表示3333333333333将为我们提供尾数(或有效数字)部分。那是

0011001100110011001100110011001100110011001100110011

<强>指数

指数部分(11位)应该是2^(11-1) - 1 = 1023的偏移量,因此尾随3是p-2(在sprintf给出的输出中)我们有

-2 + 1023 = 1021

及其以11位固定的二进制表示是

01111111101

登录

对于符号位,其0表示正数,1表示

双精度表示

所以完整的表示是

0 | 01111111101 | 0011001100110011001100110011001100110011001100110011

另一个例子:

> sprintf("%a", -2.94)
[1] "-0x1.7851eb851eb85p+1"

# Mantissa or Significand
(7851eb851eb85) # base 16 
(0111100001010001111010111000010100011110101110000101) # base 2

# Exponent
1 + 1023 = 1024 # base 10
10000000000 # base 2

# So the complete representation is
1 | 10000000000 | 0111100001010001111010111000010100011110101110000101