| Copyright | (c) 2014 Josh Kirklin |
|---|---|
| License | MIT |
| Maintainer | jjvk2@cam.ac.uk |
| Safe Haskell | None |
| Language | Haskell2010 |
Control.Arrow.Needle.TH
Description
This module combines the parsing from Control.Arrow.Needle.Parse with Template Haskell.
- nd :: QuasiQuoter
- ndFile :: FilePath -> ExpQ
Documentation
nd :: QuasiQuoter Source
The inline needle quasi-quoter.
{-# LANGUAGE QuasiQuotes #-}
exampleArrow :: Num c => (a,b,c) -> (a,a,b,c,c)
exampleArrow = [nd|
}===========>
\========>
}===========>
}==={negate}>
\========>
|]