{-# LANGUAGE TemplateHaskell #-}
module TSimpleExp where
import Language.Haskell.TH ( tupE, litE, integerL )

main :: IO ()
main = return ()