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

import TemplateHaskellQuasiquotes

$(aDecl)

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