31
31
*/
32
32
33
33
#include "stdlib/math/base/special/log10.h"
34
- #include "stdlib/math/ base/assert/is_nan .h"
34
+ #include "stdlib/number/float64/ base/to_words .h"
35
35
#include "stdlib/number/float64/base/get_high_word.h"
36
36
#include "stdlib/number/float64/base/set_high_word.h"
37
37
#include "stdlib/number/float64/base/set_low_word.h"
38
+ #include "stdlib/constants/float64/high_word_abs_mask.h"
39
+ #include "stdlib/constants/float64/high_word_significand_mask.h"
38
40
#include "stdlib/constants/float64/exponent_bias.h"
39
41
#include "stdlib/constants/float64/ninf.h"
40
42
@@ -44,17 +46,14 @@ static const double IVLN10LO = 2.50829467116452752298e-11; // 0x3dbb9438, 0xca9
44
46
static const double LOG10_2HI = 3.01029995663611771306e-01 ; // 0x3FD34413, 0x509F6000
45
47
static const double LOG10_2LO = 3.69423907715893078616e-13 ; // 0x3D59FEF3, 0x11F12B36
46
48
47
- // 0x000fffff = 1048575 => 0 00000000000 11111111111111111111
48
- static const int64_t HIGH_SIGNIFICAND_MASK = 0x000fffff ;
49
-
50
49
// 0x7ff00000 = 2146435072 => 0 11111111111 00000000000000000000 => biased exponent: 2047 = 1023+1023 => 2^1023
51
- static const int64_t HIGH_MAX_NORMAL_EXP = 0x7ff00000 ;
50
+ static const int32_t HIGH_MAX_NORMAL_EXP = 0x7ff00000 ;
52
51
53
52
// 0x00100000 = 1048576 => 0 00000000001 00000000000000000000 => biased exponent: 1 = -1022+1023 => 2^-1022
54
- static const int64_t HIGH_MIN_NORMAL_EXP = 0x00100000 ;
53
+ static const int32_t HIGH_MIN_NORMAL_EXP = 0x00100000 ;
55
54
56
55
// 0x3ff00000 = 1072693248 => 0 01111111111 00000000000000000000 => biased exponent: 1023 = 0+1023 => 2^0 = 1
57
- static const int64_t HIGH_BIASED_EXP_0 = 0x3ff00000 ;
56
+ static const int32_t HIGH_BIASED_EXP_0 = 0x3ff00000 ;
58
57
59
58
// 1/3
60
59
static const double ONE_THIRD = 0.33333333333333333 ;
@@ -110,97 +109,107 @@ static double polyval_q( const double x ) {
110
109
* @returns {number} function value
111
110
*/
112
111
double klog ( const double x ) {
113
- double hfsq ;
114
- double t1 ;
115
- double t2 ;
116
- uint32_t hx ;
117
- double f ;
118
- double s ;
119
- double z ;
120
- double R ;
121
- double w ;
122
- int32_t i ;
123
- int32_t j ;
124
-
125
- stdlib_base_float64_get_high_word ( x , & hx );
126
- f = x - 1.0 ;
127
- if ( ( HIGH_SIGNIFICAND_MASK & ( 2 + hx ) ) < 3 ) {
128
- // Case: -2**-20 <= f < 2**-20
129
- if ( f == 0.0 ) {
130
- return 0.0 ;
131
- }
132
- return f * f * ( ( ONE_THIRD * f ) - 0.5 );
133
- }
134
- s = f / ( 2.0 + f );
135
- z = s * s ;
136
- hx &= HIGH_SIGNIFICAND_MASK ;
137
- i = (hx - 0x6147a );
138
- w = z * z ;
139
- j = ( 0x6b851 - hx );
140
- t1 = w * polyval_p ( w );
141
- t2 = z * polyval_q ( w );
142
- i |= j ;
143
- R = t2 + t1 ;
144
- if ( i > 0 ) {
145
- hfsq = 0.5 * f * f ;
146
- return ( s * ( hfsq + R ) ) - hfsq ;
147
- }
148
- return s * ( R - f );
112
+ double hfsq ;
113
+ uint32_t hx ;
114
+ int32_t ihx ;
115
+ int32_t i ;
116
+ int32_t j ;
117
+ double t1 ;
118
+ double t2 ;
119
+ double f ;
120
+ double s ;
121
+ double z ;
122
+ double R ;
123
+ double w ;
124
+
125
+ stdlib_base_float64_get_high_word ( x , & hx );
126
+ ihx = (int32_t )hx ;
127
+ f = x - 1.0 ;
128
+ if ( ( STDLIB_CONSTANT_FLOAT64_HIGH_WORD_SIGNIFICAND_MASK & ( 2 + ihx ) ) < 3 ) {
129
+ // Case: -2**-20 <= f < 2**-20
130
+ if ( f == 0.0 ) {
131
+ return 0.0 ;
132
+ }
133
+ return f * f * ( ( ONE_THIRD * f ) - 0.5 );
134
+ }
135
+ s = f / ( 2.0 + f );
136
+ z = s * s ;
137
+ ihx &= STDLIB_CONSTANT_FLOAT64_HIGH_WORD_SIGNIFICAND_MASK ;
138
+ i = (ihx - 0x6147a );
139
+ w = z * z ;
140
+ j = ( 0x6b851 - ihx );
141
+ t1 = w * polyval_p ( w );
142
+ t2 = z * polyval_q ( w );
143
+ i |= j ;
144
+ R = t2 + t1 ;
145
+ if ( i > 0 ) {
146
+ hfsq = 0.5 * f * f ;
147
+ return ( s * ( hfsq + R ) ) - hfsq ;
148
+ }
149
+ return s * ( R - f );
149
150
}
150
151
151
152
/**
152
153
* Evaluates the common logarithm (base ten).
153
154
*
154
155
* @param x input value
155
- * @return output value
156
+ * @return output value
156
157
*
157
158
* @example
158
159
* double out = stdlib_base_log10( 4.0 );
159
160
* // returns 0.6020599913279624
160
161
*/
161
162
double stdlib_base_log10 ( const double x ) {
162
- double xc = x ;
163
- double hi ;
164
- uint32_t hx ;
165
- double lo ;
166
- double f ;
167
- int32_t i ;
168
- int32_t k ;
169
- int32_t y ;
170
- double z ;
171
-
172
- if ( stdlib_base_is_nan ( xc ) || xc < 0.0 ) {
173
- return 0.0 / 0.0 ; // NaN
174
- }
175
- if ( xc == 0.0 ) {
176
- return STDLIB_CONSTANT_FLOAT64_NINF ;
177
- }
178
- stdlib_base_float64_get_high_word ( xc , & hx );
179
- k = 0 ;
180
-
181
- // Case: 0 < x < 2**-1022
182
- if ( hx < HIGH_MIN_NORMAL_EXP ) {
183
- // Subnormal number, scale up `x`...
184
- k -= 54 ;
185
- xc *= TWO54 ;
186
- stdlib_base_float64_get_high_word ( xc , & hx );
187
- }
188
- if ( hx >= HIGH_MAX_NORMAL_EXP ) {
189
- return x + x ;
190
- }
191
- k += ( ( hx >>20 ) - STDLIB_CONSTANT_FLOAT64_EXPONENT_BIAS );
192
- hx &= HIGH_SIGNIFICAND_MASK ;
193
- i = ( hx + 0x95f64 ) & 0x100000 ;
194
-
195
- // Normalize `x` or `x/2`...
196
- stdlib_base_float64_set_high_word ( hx | ( i ^ HIGH_BIASED_EXP_0 ), & xc );
197
- k += i >> 20 ;
198
- y = k ;
199
- f = klog ( xc );
200
- xc -= 1.0 ;
201
- stdlib_base_float64_set_low_word ( 0 , & hi );
202
- lo = xc - hi ;
203
- z = ( y * LOG10_2LO ) + ( ( xc + f ) * IVLN10LO );
204
- z += ( ( lo + f ) * IVLN10HI ) + ( hi * IVLN10HI );
205
- return z + ( y * LOG10_2HI );
163
+ int32_t ihx ;
164
+ int32_t ilx ;
165
+ uint32_t hx ;
166
+ uint32_t lx ;
167
+ int32_t i ;
168
+ int32_t k ;
169
+ double xc ;
170
+ double hi ;
171
+ double lo ;
172
+ double f ;
173
+ double y ;
174
+ double z ;
175
+
176
+ xc = x ;
177
+ stdlib_base_float64_to_words ( x , & hx , & lx );
178
+ ihx = (int32_t )hx ;
179
+ ilx = (int32_t )lx ;
180
+ k = 0 ;
181
+
182
+ // Case: 0 < x < 2**-1022
183
+ if ( ihx < HIGH_MIN_NORMAL_EXP ) {
184
+ if ( ( ( ihx & STDLIB_CONSTANT_FLOAT64_HIGH_WORD_ABS_MASK ) | ilx ) == 0 ) {
185
+ return STDLIB_CONSTANT_FLOAT64_NINF ;
186
+ }
187
+ if ( ihx < 0 ) {
188
+ return 0.0 / 0.0 ; // NaN
189
+ }
190
+ // Subnormal number, scale up `x`...
191
+ k -= 54 ;
192
+ xc *= TWO54 ;
193
+ stdlib_base_float64_get_high_word ( xc , & hx );
194
+ ihx = (int32_t )hx ;
195
+ }
196
+ if ( ihx >= HIGH_MAX_NORMAL_EXP ) {
197
+ return x + x ;
198
+ }
199
+ k += ( ( ihx >>20 ) - STDLIB_CONSTANT_FLOAT64_EXPONENT_BIAS );
200
+ ihx &= STDLIB_CONSTANT_FLOAT64_HIGH_WORD_SIGNIFICAND_MASK ;
201
+ i = ( ihx + 0x95f64 ) & 0x100000 ;
202
+
203
+ // Normalize `x` or `x/2`...
204
+ stdlib_base_float64_set_high_word ( ihx | ( i ^ HIGH_BIASED_EXP_0 ), & xc );
205
+ k += i >> 20 ;
206
+ y = (double )k ;
207
+ f = klog ( xc );
208
+ xc -= 1.0 ;
209
+ hi = xc ;
210
+ stdlib_base_float64_set_low_word ( 0 , & hi );
211
+ lo = xc - hi ;
212
+ z = ( y * LOG10_2LO ) + ( ( xc + f ) * IVLN10LO );
213
+ z += ( ( lo + f ) * IVLN10HI ) + ( hi * IVLN10HI );
214
+ return z + ( y * LOG10_2HI );
206
215
}
0 commit comments