Skip to content
Snippets Groups Projects
Commit 28cccb94 authored by simonpj's avatar simonpj
Browse files

Test Trac #5041

parent 6b3fd058
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE MagicHash #-}
module Main where
data T = T1# | T2# Int deriving( Read, Show )
foo :: [T]
foo = read "[ T1#, T2# 4, T2# 5 ]"
main = print foo
[T1#,T2# 4,T2# 5]
......@@ -31,3 +31,4 @@ test('drvrun-functor1', normal, compile_and_run, [''])
test('drvrun-foldable1', normal, compile_and_run, [''])
test('T4136', normal, compile_and_run, [''])
test('T4528a', normal, compile_and_run, [''])
test('T5041', normal, compile_and_run, [''])
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment