{-# LANGUAGE Haskell2010 #-}
{-# LANGUAGE TemplateHaskell #-}
module TemplateHaskellSplices where

import TemplateHaskellQuasiquotes

$(aDecl)

foo :: Integer
foo = Integer -> Integer
forall a. a -> a
id $(anExpression2)

pat :: [(a, String)] -> ()
pat $(aPattern) = ()

qux :: ()
qux = () -> ()
forall a. a -> a
id $$(typedExpr)