{-# LANGUAGE EmptyDataDecls #-}
module Opaleye.SQLite.SqlTypes (module Opaleye.SQLite.SqlTypes) where
import           Opaleye.SQLite.Internal.Column (Column)
import qualified Opaleye.SQLite.PGTypes as PT
import qualified Data.Text as SText
import qualified Data.Text.Lazy as LText
type SqlBool   = PT.PGBool
type SqlDate   = PT.PGDate
type SqlReal   = PT.PGFloat8
type SqlText   = PT.PGText
type SqlInt    = PT.PGInt4
sqlString :: String -> Column SqlText
sqlString :: String -> Column SqlText
sqlString = String -> Column SqlText
PT.pgString
sqlStrictText :: SText.Text -> Column SqlText
sqlStrictText :: Text -> Column SqlText
sqlStrictText = Text -> Column SqlText
PT.pgStrictText
sqlLazyText :: LText.Text -> Column SqlText
sqlLazyText :: Text -> Column SqlText
sqlLazyText = Text -> Column SqlText
PT.pgLazyText
sqlInt :: Int -> Column SqlInt
sqlInt :: Int -> Column SqlInt
sqlInt = Int -> Column SqlInt
PT.pgInt4
sqlReal :: Double -> Column SqlReal
sqlReal :: Double -> Column SqlReal
sqlReal = Double -> Column SqlReal
PT.pgDouble
sqlBool :: Bool -> Column SqlBool
sqlBool :: Bool -> Column SqlBool
sqlBool = Bool -> Column SqlBool
PT.pgBool