module Opaleye.TextSearch.Internal.Types where

import Opaleye.Internal.PGTypes (IsSqlType(..))

data SqlTSQuery
data SqlTSVector

instance IsSqlType SqlTSQuery where
  showSqlType :: forall (proxy :: * -> *). proxy SqlTSQuery -> String
showSqlType proxy SqlTSQuery
_ = String
"tsquery"