module Hydra.Lib.Literals where
bigfloatToBigint :: Double -> Integer
bigfloatToBigint :: Double -> Integer
bigfloatToBigint = forall a b. (RealFrac a, Integral b) => a -> b
round
bigintToBigfloat :: Integer -> Double
bigintToBigfloat :: Integer -> Double
bigintToBigfloat = forall a b. (Integral a, Num b) => a -> b
fromIntegral
showInt32 :: Int -> String
showInt32 :: Int -> String
showInt32 = forall a. Show a => a -> String
show
showString :: String -> String
showString :: String -> String
showString = forall a. Show a => a -> String
show