module TextShow.Data.Integral (
showbIntegralPrec
, showbIntAtBase
, showbBin
, showbHex
, showbOct
) where
import Data.Char (intToDigit)
import Data.Int (Int8, Int16, Int32, Int64)
import Data.Monoid.Compat ((<>))
import Data.Text.Lazy.Builder (Builder, singleton)
import Data.Text.Lazy.Builder.Int (decimal)
import Data.Word (Word8, Word16, Word32, Word64)
import GHC.Exts (Int(I#))
#if __GLASGOW_HASKELL__ >= 708
import GHC.Exts (isTrue#)
import GHC.Prim (Int#)
#endif
import GHC.Prim ((<#), (>#))
import Prelude ()
import Prelude.Compat
import TextShow.Classes (TextShow(..))
import TextShow.Utils (toString)
showbIntegralPrec :: Integral a => Int -> a -> Builder
showbIntegralPrec p = showbPrec p . toInteger
showbIntAtBase :: (Integral a, TextShow a) => a -> (Int -> Char) -> a -> Builder
showbIntAtBase base toChr n0
| base <= 1 = error . toString $ "TextShow.Int.showbIntAtBase: applied to unsupported base" <> showb base
| n0 < 0 = error . toString $ "TextShow.Int.showbIntAtBase: applied to negative number " <> showb n0
| otherwise = showbIt (quotRem n0 base) mempty
where
showbIt (n, d) b = seq c $
case n of
0 -> b'
_ -> showbIt (quotRem n base) b'
where
c :: Char
c = toChr $ fromIntegral d
b' :: Builder
b' = singleton c <> b
showbBin :: (Integral a, TextShow a) => a -> Builder
showbBin = showbIntAtBase 2 intToDigit
showbHex :: (Integral a, TextShow a) => a -> Builder
showbHex = showbIntAtBase 16 intToDigit
showbOct :: (Integral a, TextShow a) => a -> Builder
showbOct = showbIntAtBase 8 intToDigit
instance TextShow Int where
showbPrec (I# p) n'@(I# n)
| isTrue (n <# 0#) && isTrue (p ># 6#)
= singleton '(' <> decimal n' <> singleton ')'
| otherwise
= decimal n'
where
#if __GLASGOW_HASKELL__ >= 708
isTrue :: Int# -> Bool
isTrue b = isTrue# b
#else
isTrue :: Bool -> Bool
isTrue = id
#endif
instance TextShow Int8 where
showbPrec p x = showbPrec p (fromIntegral x :: Int)
instance TextShow Int16 where
showbPrec p x = showbPrec p (fromIntegral x :: Int)
instance TextShow Int32 where
showbPrec p x = showbPrec p (fromIntegral x :: Int)
instance TextShow Int64 where
#if WORD_SIZE_IN_BITS < 64
showbPrec p = showbPrec p . toInteger
#else
showbPrec p x = showbPrec p (fromIntegral x :: Int)
#endif
instance TextShow Integer where
showbPrec p n
| p > 6 && n < 0 = singleton '(' <> decimal n <> singleton ')'
| otherwise = decimal n
instance TextShow Word where
showb = decimal
instance TextShow Word8 where
showb = decimal
instance TextShow Word16 where
showb = decimal
instance TextShow Word32 where
showb = decimal
instance TextShow Word64 where
showb = decimal