Lines Matching full:if
57 The substring contains no characters if <[str]> is empty, consists
58 entirely of whitespace, or if the first non-whitespace
60 digit, and cannot be parsed as infinity or NaN. If the platform
62 If the substring is empty, no conversion is done, and
66 <[str]>) is stored in <<*<[tail]>>>. If you want no
76 locale specified by the locale object locale. If <[locale]> is
84 These functions return the converted substring value, if any. If
85 no conversion could be performed, 0 is returned. If the correct
88 <<ERANGE>> is stored in errno. If the correct value would cause
191 if (!scale || (i = 2*P + 1 - ((dword0(x) & Exp_mask) >> Exp_shift)) <= 0) in sulp()
236 if (k & STRTOG_Neg) in ULtod()
283 if (*++s)
299 if (*s == '0') {
308 /* If the number is not hex, then the parse of
312 #if defined(FE_DOWNWARD) && defined(FE_TONEAREST) && defined(FE_TOWARDZERO) && defined(FE_UPWARD)
330 if (bb) {
337 if ((dword0(rv)&Exp_mask) == 0)
347 if (!*s)
353 if (nd < 9)
358 if (strncmp (s, decimal_point, dec_len) == 0)
362 if (!nd) {
365 if (c > '0' && c <= '9') {
376 if (c -= '0') {
379 if (nd++ < 9)
381 else if (nd <= DBL_DIG + 1)
383 if (nd++ < 9)
385 else if (nd <= DBL_DIG + 1)
393 if (c == 'e' || c == 'E') {
394 if (!nd && !nz && !nz0) {
406 if (c >= '0' && c <= '9') {
409 if (c > '0' && c <= '9') {
414 if (s - s1 > 8 || L > 19999)
421 if (esign)
430 if (!nd) {
431 if (!nz && !nz0) {
437 if (!decpt)
441 if (match(&s,"nf")) {
443 if (!match(&s,"inity"))
454 if (match(&s, "an")) {
456 if (*s == '(' /*)*/
487 if (!nd0)
491 if (k > 9) {
493 if (k > DBL_DIG)
499 if (nd <= DBL_DIG
506 if (!e)
508 if (e > 0) {
509 if (e <= Ten_pmax) {
515 if (sign) {
525 if (e <= Ten_pmax + i) {
531 if (sign) {
545 if ((dword0(rv) & Exp_mask)
556 else if (e >= -Ten_pmax) {
559 if (sign) {
574 if (k <= DBL_DIG)
581 if ((rounding = Flt_Rounds) >= 2) {
582 if (sign)
585 if (rounding != 2)
593 if (e1 > 0) {
594 if ( (i = e1 & 15) !=0)
596 if (e1 &= ~15) {
597 if (e1 > DBL_MAX_10_EXP) {
636 if (bd0)
642 if (e1 & 1)
647 if ((z = dword0(rv) & Exp_mask)
650 if (z > Exp_msk1*(DBL_MAX_EXP+Bias-1-P)) {
662 else if (e1 < 0) {
664 if ( (i = e1 & 15) !=0)
666 if (e1 >>= 4) {
667 if (e1 >= 1 << n_bigtens)
670 if (e1 & Scale_Bit)
673 if (e1 & 1)
675 if (scale && (j = 2*P + 1 - ((dword0(rv) & Exp_mask)
678 if (j >= 32) {
682 if (j >= 53)
694 if (e1 & 1)
699 if (!dval(rv)) {
703 if (!dval(rv)) {
709 if (bd0)
733 if (bd0 == NULL)
738 if (bd == NULL)
742 if (bb == NULL)
745 if (bs == NULL)
748 if (e >= 0) {
756 if (bbe >= 0)
762 if (rounding != 1)
771 if (i < Emin) { /* denormal */
774 if (i < 32)
789 if (i < Emin) /* denormal */
801 if (i > bs2)
803 if (i > 0) {
808 if (bb5 > 0) {
810 if (bs == NULL)
813 if (bb1 == NULL)
818 if (bb2 > 0) {
820 if (bb == NULL)
823 if (bd5 > 0) {
825 if (bd == NULL)
828 if (bd2 > 0) {
830 if (bd == NULL)
833 if (bs2 > 0) {
835 if (bs == NULL)
839 if (delta == NULL)
845 if (rounding != 1) {
846 if (i < 0) {
848 if (!delta->_x[0] && delta->_wds <= 1) {
855 if (rounding) {
856 if (dsign) {
861 else if (!dsign) {
863 if (!dword1(rv)
867 if (!scale || y > 2*P*Exp_msk1)
869 if (y)
873 if (cmp(delta, bs) <= 0)
879 if (scale && (y = dword0(rv) & Exp_mask)
884 if ((dword0(rv) & Exp_mask) <=
898 if (adj < 1.)
900 if (adj <= 0x7ffffffe) {
903 if (y != adj) {
904 if (!((rounding>>1) ^ dsign))
910 if (scale && (y = dword0(rv) & Exp_mask) <= 2*P*Exp_msk1)
914 if ((dword0(rv) & Exp_mask) <= P*Exp_msk1) {
917 if (dsign)
927 if (dsign) {
928 if (dword0(rv) == Big0 && dword1(rv) == Big1)
937 if (i < 0) {
941 if (dsign || dword1(rv) || dword0(rv) & Bndry_mask
951 if (!delta->x[0] && delta->wds <= 1)
956 if (!delta->_x[0] && delta->_wds <= 1) {
964 if (cmp(delta, bs) > 0)
968 if (i == 0) {
970 if (dsign) {
971 if ((dword0(rv) & Bndry_mask1) == Bndry_mask1
979 if (dword0(rv) == Big0 && dword1(rv) == Big1)
996 else if (!(dword0(rv) & Bndry_mask) && !dword1(rv)) {
1002 if (L < Exp_msk1)
1005 if (L <= (scale ? (2*P+1)*Exp_msk1 : Exp_msk1))
1007 if (L <= Exp_msk1)
1014 if (scale) {
1016 if (L <= (Long) ((2*P+1)*Exp_msk1)) {
1017 if (L > (Long)((P+2)*Exp_msk1))
1040 if (Lsb1) {
1041 if (!(dword0(rv) & Lsb1))
1044 else if (!(dword1(rv) & Lsb))
1047 if (!(dword1(rv) & LSB))
1051 if (dsign)
1065 if (!dval(rv))
1075 if ((aadj = ratio(delta, bs)) <= 2.) {
1076 if (dsign)
1078 else if (dword1(rv) || dword0(rv) & Bndry_mask) {
1080 if (dword1(rv) == Tiny1 && !dword0(rv))
1090 if (aadj < 2./FLT_RADIX)
1110 if (Flt_Rounds == 0)
1118 if (y == Exp_msk1*(DBL_MAX_EXP+Bias-1)) {
1123 if ((dword0(rv) & Exp_mask) >=
1125 if (dword0(rv0) == Big0 && dword1(rv0) == Big1)
1138 if (scale && y <= 2*P*Exp_msk1) {
1139 if (aadj <= 0x7fffffff) {
1140 if ((z = aadj) == 0)
1151 if ((dword0(rv) & Exp_mask) <= P*Exp_msk1) {
1157 if ((dword0(rv) & Exp_mask) < P*Exp_msk1)
1159 if ((dword0(rv) & Exp_mask) <= P*Exp_msk1)
1162 if (dword0(rv0) == Tiny0
1183 * If rv * ulp(rv) is denormalized (i.e.,
1188 if (y <= (P-1)*Exp_msk1 && aadj > 1.) {
1190 if (!dsign)
1201 if (!scale)
1203 if (y == z) {
1206 /* If FE_INVALID floating point exceptions are
1217 if (dsign || dword1(rv) || dword0(rv) & Bndry_mask) {
1218 if (aadj < .4999999 || aadj > .5000001)
1221 else if (aadj < .4999999/FLT_RADIX)
1232 if (inexact) {
1233 if (!oldinexact) {
1241 else if (!oldinexact)
1245 if (scale) {
1253 if ((dword0(rv) & Exp_mask) == 0)
1259 if (inexact && !(dword0(rv) & Exp_mask)) {
1272 if (se)
1284 #if defined(_HAVE_LONG_DOUBLE) && defined(_LDBL_EQ_DBL)
1325 if (isnan (val))
1329 if ((isinf (retval) && !isinf (val)) || (isdenormf(retval) && !isdenorm(val)))
1340 if (isnan (val))
1344 if ((isinf (retval) && !isinf (val)) || (isdenormf(retval) && !isdenorm(val)))