Hydra.Impl.Haskell.Dsl.PhantomLiterals
type Bigfloat = Double Source #
type Binary = String Source #
bigfloat :: Bigfloat -> Datum Bigfloat Source #
bigint :: Integer -> Datum Integer Source #
binary :: Binary -> Datum Binary Source #
bool :: Bool -> Datum Bool Source #
boolean :: Bool -> Datum Bool Source #
double :: Double -> Datum Double Source #
false :: Datum Bool Source #
float :: Float -> Datum Float Source #
float32 :: Float -> Datum Float Source #
float64 :: Double -> Datum Double Source #
int :: Int -> Datum Int Source #
int8 :: Int8 -> Datum Int8 Source #
int16 :: Int16 -> Datum Int16 Source #
int32 :: Int -> Datum Int Source #
int64 :: Int64 -> Datum Int64 Source #
string :: String -> Datum String Source #
true :: Datum Bool Source #
uint8 :: Int8 -> Datum Int8 Source #
uint16 :: Int16 -> Datum Int16 Source #
uint32 :: Int -> Datum Int Source #
uint64 :: Int64 -> Datum Int64 Source #