Skip to content

Commit

Permalink
Test Trac #4949
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpj committed Feb 9, 2011
1 parent 58375ed commit 8ef8afb
Show file tree
Hide file tree
Showing 2 changed files with 9 additions and 0 deletions.
8 changes: 8 additions & 0 deletions tests/ghc-regress/th/T4949.hs
Original file line number Diff line number Diff line change
@@ -0,0 +1,8 @@
{-# LANGUAGE TemplateHaskell #-}
module Foo where

import Language.Haskell.TH

x :: Int
x = let args = [| show $(varE (mkName "x")) |]
in undefined
1 change: 1 addition & 0 deletions tests/ghc-regress/th/all.T
Original file line number Diff line number Diff line change
Expand Up @@ -174,3 +174,4 @@ test('T1835', normal, compile_and_run, ['-v0'])

test('TH_viewPatPrint', normal, compile_and_run, [''])
test('T4436', normal, compile, ['-v0 -ddump-splices'])
test('T4949', normal, compile, ['-v0'])

0 comments on commit 8ef8afb

Please sign in to comment.