module FFICXX.Generate.QQ.Verbatim where

import Language.Haskell.TH.Quote
import Language.Haskell.TH.Lib

verbatim :: QuasiQuoter
verbatim :: QuasiQuoter
verbatim = QuasiQuoter :: (String -> Q Exp)
-> (String -> Q Pat)
-> (String -> Q Type)
-> (String -> Q [Dec])
-> QuasiQuoter
QuasiQuoter{ quoteExp :: String -> Q Exp
quoteExp = Lit -> Q Exp
litE (Lit -> Q Exp) -> (String -> Lit) -> String -> Q Exp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Lit
stringL
                      , quotePat :: String -> Q Pat
quotePat = String -> Q Pat
forall a. HasCallStack => a
undefined
                      , quoteType :: String -> Q Type
quoteType = String -> Q Type
forall a. HasCallStack => a
undefined
                      , quoteDec :: String -> Q [Dec]
quoteDec = String -> Q [Dec]
forall a. HasCallStack => a
undefined
                      --           , quotePat = litP . stringP
                      }