Skip to content

Instantly share code, notes, and snippets.

@konn
Created June 23, 2010 16:42
Show Gist options
  • Star 0 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save konn/450183 to your computer and use it in GitHub Desktop.
Save konn/450183 to your computer and use it in GitHub Desktop.
{-# LANGUAGE TemplateHaskell, NamedFieldPuns, TupleSections #-}
module Quote (gr) where
import Language.Haskell.TH
import Language.Haskell.TH.Quote
import Text.Parsec hiding ((<|>), many, State)
import Control.Applicative
import EasyGrapher
parseGraph :: (Monad m) => (String, Int, Int) -> String -> m (EGGraph String)
parseGraph (file, line, col) src =
case (parse p "" src) of
Left err -> fail $ show err
Right gr -> return gr
where
p = do
pos <- getPosition
setPosition $
(flip setSourceName) file $
(flip setSourceLine) line $
(flip setSourceColumn) col $
pos
spaces *> lexeme(graphs)
symbol s = lexeme $ string s
lexeme :: Parsec String u a -> Parsec String u a
lexeme p = p <* spaces
graphs :: Parsec String () (EGGraph String)
graphs = try(sepBy1 edge (symbol ","))
edge = (:=>) <$> (ident <* symbol "->") <*> ident
ident = lexeme $ many1 alphaNum
gr :: QuasiQuoter
gr = QuasiQuoter quoteGraphExp quoteGraphPat
quoteGraphExp :: String -> ExpQ
quoteGraphExp src = do
loc <- location
let pos=(loc_filename loc, fst $ loc_start loc, snd $ loc_start loc)
gr <- parseGraph pos src
appE (varE 'buildGraph) $ dataToExpQ (const Nothing) gr
quoteGraphPat :: String -> PatQ
quoteGraphPat src = do
loc <- location
let pos=(loc_filename loc, fst $ loc_start loc, snd $ loc_start loc)
gr <- parseGraph pos src
dataToPatQ (const Nothing) gr
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment