@@ -56,6 +56,16 @@ setReadOnly( constants, 'ABS_MASK', require( '@stdlib/constants/float32/abs-mask
5656*/
5757setReadOnly ( constants , 'CBRT_EPS' , require ( '@stdlib/constants/float32/cbrt-eps' ) ) ;
5858
59+ /**
60+ * @name E
61+ * @memberof constants
62+ * @readonly
63+ * @constant
64+ * @type {number }
65+ * @see {@link module:@stdlib/constants/float32/e }
66+ */
67+ setReadOnly ( constants , 'E' , require ( '@stdlib/constants/float32/e' ) ) ;
68+
5969/**
6070* @name EPS
6171* @memberof constants
@@ -86,6 +96,76 @@ setReadOnly( constants, 'EXPONENT_BIAS', require( '@stdlib/constants/float32/exp
8696*/
8797setReadOnly ( constants , 'EXPONENT_MASK' , require ( '@stdlib/constants/float32/exponent-mask' ) ) ;
8898
99+ /**
100+ * @name FOURTH_PI
101+ * @memberof constants
102+ * @readonly
103+ * @constant
104+ * @type {number }
105+ * @see {@link module:@stdlib/constants/float32/fourth-pi }
106+ */
107+ setReadOnly ( constants , 'FOURTH_PI' , require ( '@stdlib/constants/float32/fourth-pi' ) ) ;
108+
109+ /**
110+ * @name HALF_LN_TWO
111+ * @memberof constants
112+ * @readonly
113+ * @constant
114+ * @type {number }
115+ * @see {@link module:@stdlib/constants/float32/half-ln-two }
116+ */
117+ setReadOnly ( constants , 'HALF_LN_TWO' , require ( '@stdlib/constants/float32/half-ln-two' ) ) ;
118+
119+ /**
120+ * @name HALF_PI
121+ * @memberof constants
122+ * @readonly
123+ * @constant
124+ * @type {number }
125+ * @see {@link module:@stdlib/constants/float32/half-pi }
126+ */
127+ setReadOnly ( constants , 'HALF_PI' , require ( '@stdlib/constants/float32/half-pi' ) ) ;
128+
129+ /**
130+ * @name LN_HALF
131+ * @memberof constants
132+ * @readonly
133+ * @constant
134+ * @type {number }
135+ * @see {@link module:@stdlib/constants/float32/ln-half }
136+ */
137+ setReadOnly ( constants , 'LN_HALF' , require ( '@stdlib/constants/float32/ln-half' ) ) ;
138+
139+ /**
140+ * @name LN_PI
141+ * @memberof constants
142+ * @readonly
143+ * @constant
144+ * @type {number }
145+ * @see {@link module:@stdlib/constants/float32/ln-pi }
146+ */
147+ setReadOnly ( constants , 'LN_PI' , require ( '@stdlib/constants/float32/ln-pi' ) ) ;
148+
149+ /**
150+ * @name LN_TEN
151+ * @memberof constants
152+ * @readonly
153+ * @constant
154+ * @type {number }
155+ * @see {@link module:@stdlib/constants/float32/ln-ten }
156+ */
157+ setReadOnly ( constants , 'LN_TEN' , require ( '@stdlib/constants/float32/ln-ten' ) ) ;
158+
159+ /**
160+ * @name LN_TWO
161+ * @memberof constants
162+ * @readonly
163+ * @constant
164+ * @type {number }
165+ * @see {@link module:@stdlib/constants/float32/ln-two }
166+ */
167+ setReadOnly ( constants , 'LN_TWO' , require ( '@stdlib/constants/float32/ln-two' ) ) ;
168+
89169/**
90170* @name MAX
91171* @memberof constants
@@ -96,6 +176,56 @@ setReadOnly( constants, 'EXPONENT_MASK', require( '@stdlib/constants/float32/exp
96176*/
97177setReadOnly ( constants , 'MAX' , require ( '@stdlib/constants/float32/max' ) ) ;
98178
179+ /**
180+ * @name MAX_BASE2_EXPONENT
181+ * @memberof constants
182+ * @readonly
183+ * @constant
184+ * @type {number }
185+ * @see {@link module:@stdlib/constants/float32/max-base2-exponent }
186+ */
187+ setReadOnly ( constants , 'MAX_BASE2_EXPONENT' , require ( '@stdlib/constants/float32/max-base2-exponent' ) ) ;
188+
189+ /**
190+ * @name MAX_BASE2_EXPONENT_SUBNORMAL
191+ * @memberof constants
192+ * @readonly
193+ * @constant
194+ * @type {number }
195+ * @see {@link module:@stdlib/constants/float32/max-base2-exponent-subnormal }
196+ */
197+ setReadOnly ( constants , 'MAX_BASE2_EXPONENT_SUBNORMAL' , require ( '@stdlib/constants/float32/max-base2-exponent-subnormal' ) ) ;
198+
199+ /**
200+ * @name MAX_BASE10_EXPONENT
201+ * @memberof constants
202+ * @readonly
203+ * @constant
204+ * @type {number }
205+ * @see {@link module:@stdlib/constants/float32/max-base10-exponent }
206+ */
207+ setReadOnly ( constants , 'MAX_BASE10_EXPONENT' , require ( '@stdlib/constants/float32/max-base10-exponent' ) ) ;
208+
209+ /**
210+ * @name MAX_BASE10_EXPONENT_SUBNORMAL
211+ * @memberof constants
212+ * @readonly
213+ * @constant
214+ * @type {number }
215+ * @see {@link module:@stdlib/constants/float32/max-base10-exponent-subnormal }
216+ */
217+ setReadOnly ( constants , 'MAX_BASE10_EXPONENT_SUBNORMAL' , require ( '@stdlib/constants/float32/max-base10-exponent-subnormal' ) ) ;
218+
219+ /**
220+ * @name MAX_SAFE_FIBONACCI
221+ * @memberof constants
222+ * @readonly
223+ * @constant
224+ * @type {number }
225+ * @see {@link module:@stdlib/constants/float32/max-safe-fibonacci }
226+ */
227+ setReadOnly ( constants , 'MAX_SAFE_FIBONACCI' , require ( '@stdlib/constants/float32/max-safe-fibonacci' ) ) ;
228+
99229/**
100230* @name MAX_SAFE_INTEGER
101231* @memberof constants
@@ -106,6 +236,76 @@ setReadOnly( constants, 'MAX', require( '@stdlib/constants/float32/max' ) );
106236*/
107237setReadOnly ( constants , 'MAX_SAFE_INTEGER' , require ( '@stdlib/constants/float32/max-safe-integer' ) ) ;
108238
239+ /**
240+ * @name MAX_SAFE_NTH_FACTORIAL
241+ * @memberof constants
242+ * @readonly
243+ * @constant
244+ * @type {number }
245+ * @see {@link module:@stdlib/constants/float32/max-safe-nth-factorial }
246+ */
247+ setReadOnly ( constants , 'MAX_SAFE_NTH_FACTORIAL' , require ( '@stdlib/constants/float32/max-safe-nth-factorial' ) ) ;
248+
249+ /**
250+ * @name MAX_SAFE_NTH_FIBONACCI
251+ * @memberof constants
252+ * @readonly
253+ * @constant
254+ * @type {number }
255+ * @see {@link module:@stdlib/constants/float32/max-safe-nth-fibonacci }
256+ */
257+ setReadOnly ( constants , 'MAX_SAFE_NTH_FIBONACCI' , require ( '@stdlib/constants/float32/max-safe-nth-fibonacci' ) ) ;
258+
259+ /**
260+ * @name MAX_SAFE_NTH_LUCAS
261+ * @memberof constants
262+ * @readonly
263+ * @constant
264+ * @type {number }
265+ * @see {@link module:@stdlib/constants/float32/max-safe-nth-lucas }
266+ */
267+ setReadOnly ( constants , 'MAX_SAFE_NTH_LUCAS' , require ( '@stdlib/constants/float32/max-safe-nth-lucas' ) ) ;
268+
269+ /**
270+ * @name MIN_BASE2_EXPONENT
271+ * @memberof constants
272+ * @readonly
273+ * @constant
274+ * @type {number }
275+ * @see {@link module:@stdlib/constants/float32/min-base2-exponent }
276+ */
277+ setReadOnly ( constants , 'MIN_BASE2_EXPONENT' , require ( '@stdlib/constants/float32/min-base2-exponent' ) ) ;
278+
279+ /**
280+ * @name MIN_BASE2_EXPONENT_SUBNORMAL
281+ * @memberof constants
282+ * @readonly
283+ * @constant
284+ * @type {number }
285+ * @see {@link module:@stdlib/constants/float32/min-base2-exponent-subnormal }
286+ */
287+ setReadOnly ( constants , 'MIN_BASE2_EXPONENT_SUBNORMAL' , require ( '@stdlib/constants/float32/min-base2-exponent-subnormal' ) ) ;
288+
289+ /**
290+ * @name MIN_BASE10_EXPONENT
291+ * @memberof constants
292+ * @readonly
293+ * @constant
294+ * @type {number }
295+ * @see {@link module:@stdlib/constants/float32/min-base10-exponent }
296+ */
297+ setReadOnly ( constants , 'MIN_BASE10_EXPONENT' , require ( '@stdlib/constants/float32/min-base10-exponent' ) ) ;
298+
299+ /**
300+ * @name MIN_BASE10_EXPONENT_SUBNORMAL
301+ * @memberof constants
302+ * @readonly
303+ * @constant
304+ * @type {number }
305+ * @see {@link module:@stdlib/constants/float32/min-base10-exponent-subnormal }
306+ */
307+ setReadOnly ( constants , 'MIN_BASE10_EXPONENT_SUBNORMAL' , require ( '@stdlib/constants/float32/min-base10-exponent-subnormal' ) ) ;
308+
109309/**
110310* @name MIN_SAFE_INTEGER
111311* @memberof constants
@@ -146,6 +346,26 @@ setReadOnly( constants, 'NINF', require( '@stdlib/constants/float32/ninf' ) );
146346*/
147347setReadOnly ( constants , 'NUM_BYTES' , require ( '@stdlib/constants/float32/num-bytes' ) ) ;
148348
349+ /**
350+ * @name PHI
351+ * @memberof constants
352+ * @readonly
353+ * @constant
354+ * @type {number }
355+ * @see {@link module:@stdlib/constants/float32/phi }
356+ */
357+ setReadOnly ( constants , 'PHI' , require ( '@stdlib/constants/float32/phi' ) ) ;
358+
359+ /**
360+ * @name PI
361+ * @memberof constants
362+ * @readonly
363+ * @constant
364+ * @type {number }
365+ * @see {@link module:@stdlib/constants/float32/pi }
366+ */
367+ setReadOnly ( constants , 'PI' , require ( '@stdlib/constants/float32/pi' ) ) ;
368+
149369/**
150370* @name PINF
151371* @memberof constants
@@ -216,6 +436,86 @@ setReadOnly( constants, 'SMALLEST_SUBNORMAL', require( '@stdlib/constants/float3
216436*/
217437setReadOnly ( constants , 'SQRT_EPS' , require ( '@stdlib/constants/float32/sqrt-eps' ) ) ;
218438
439+ /**
440+ * @name SQRT_HALF
441+ * @memberof constants
442+ * @readonly
443+ * @constant
444+ * @type {number }
445+ * @see {@link module:@stdlib/constants/float32/sqrt-half }
446+ */
447+ setReadOnly ( constants , 'SQRT_HALF' , require ( '@stdlib/constants/float32/sqrt-half' ) ) ;
448+
449+ /**
450+ * @name SQRT_HALF_PI
451+ * @memberof constants
452+ * @readonly
453+ * @constant
454+ * @type {number }
455+ * @see {@link module:@stdlib/constants/float32/sqrt-half-pi }
456+ */
457+ setReadOnly ( constants , 'SQRT_HALF_PI' , require ( '@stdlib/constants/float32/sqrt-half-pi' ) ) ;
458+
459+ /**
460+ * @name SQRT_PHI
461+ * @memberof constants
462+ * @readonly
463+ * @constant
464+ * @type {number }
465+ * @see {@link module:@stdlib/constants/float32/sqrt-phi }
466+ */
467+ setReadOnly ( constants , 'SQRT_PHI' , require ( '@stdlib/constants/float32/sqrt-phi' ) ) ;
468+
469+ /**
470+ * @name SQRT_PI
471+ * @memberof constants
472+ * @readonly
473+ * @constant
474+ * @type {number }
475+ * @see {@link module:@stdlib/constants/float32/sqrt-pi }
476+ */
477+ setReadOnly ( constants , 'SQRT_PI' , require ( '@stdlib/constants/float32/sqrt-pi' ) ) ;
478+
479+ /**
480+ * @name SQRT_THREE
481+ * @memberof constants
482+ * @readonly
483+ * @constant
484+ * @type {number }
485+ * @see {@link module:@stdlib/constants/float32/sqrt-three }
486+ */
487+ setReadOnly ( constants , 'SQRT_THREE' , require ( '@stdlib/constants/float32/sqrt-three' ) ) ;
488+
489+ /**
490+ * @name SQRT_TWO
491+ * @memberof constants
492+ * @readonly
493+ * @constant
494+ * @type {number }
495+ * @see {@link module:@stdlib/constants/float32/sqrt-two }
496+ */
497+ setReadOnly ( constants , 'SQRT_TWO' , require ( '@stdlib/constants/float32/sqrt-two' ) ) ;
498+
499+ /**
500+ * @name SQRT_TWO_PI
501+ * @memberof constants
502+ * @readonly
503+ * @constant
504+ * @type {number }
505+ * @see {@link module:@stdlib/constants/float32/sqrt-two-pi }
506+ */
507+ setReadOnly ( constants , 'SQRT_TWO_PI' , require ( '@stdlib/constants/float32/sqrt-two-pi' ) ) ;
508+
509+ /**
510+ * @name TWO_PI
511+ * @memberof constants
512+ * @readonly
513+ * @constant
514+ * @type {number }
515+ * @see {@link module:@stdlib/constants/float32/two-pi }
516+ */
517+ setReadOnly ( constants , 'TWO_PI' , require ( '@stdlib/constants/float32/two-pi' ) ) ;
518+
219519
220520// EXPORTS //
221521
0 commit comments