| Safe Haskell | None |
|---|
Text.Webrexp.Quote
Documentation
webrexpParse :: QuasiQuoterSource
QuasiQuotation to transform a webrexp to it's AST representation, resulting type is :: Webrexp. You can use it the following way :
{-# LANGUAGE QuasiQuotes #-}
import Text.Webrexp.Quote
[webrexpParse| some webrexp [.] |]
webrexpCompile :: QuasiQuoterSource
Quasi quote to transform a webrexp into it's compiled representation. You can use it the following way :
{-# LANGUAGE QuasiQuotes #-}
import Text.Webrexp.Quote
[webrexpCompile| some webrexp [.] |]