{-# LANGUAGE GeneralizedNewtypeDeriving #-}
module Orville.PostgreSQL.Expr.IfExists
( IfExists
, ifExists
)
where
import qualified Orville.PostgreSQL.Raw.RawSql as RawSql
newtype IfExists
= IfExists RawSql.RawSql
deriving
(
RawSql -> IfExists
IfExists -> RawSql
(IfExists -> RawSql)
-> (RawSql -> IfExists) -> SqlExpression IfExists
forall a. (a -> RawSql) -> (RawSql -> a) -> SqlExpression a
$ctoRawSql :: IfExists -> RawSql
toRawSql :: IfExists -> RawSql
$cunsafeFromRawSql :: RawSql -> IfExists
unsafeFromRawSql :: RawSql -> IfExists
RawSql.SqlExpression
)
ifExists :: IfExists
ifExists :: IfExists
ifExists =
RawSql -> IfExists
IfExists (RawSql -> IfExists) -> RawSql -> IfExists
forall a b. (a -> b) -> a -> b
$ String -> RawSql
RawSql.fromString String
"IF EXISTS"