Skip to content

Instantly share code, notes, and snippets.

@rrnewton
Created June 9, 2023 15:45
Show Gist options
  • Star 0 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save rrnewton/e9c0d4ac235e47d11993495a8a43f179 to your computer and use it in GitHub Desktop.
Save rrnewton/e9c0d4ac235e47d11993495a8a43f179 to your computer and use it in GitHub Desktop.
./tests/ghc-e/should_run/T2636.hs:main = print "main"
./tests/linear/should_run/LinearTypeable.hs:main = print (isJust x)
./tests/parser/should_run/BinaryLiterals0.hs:main = print lst
./tests/parser/should_run/ParserMultiWayIf.hs:main = print $ x5 == 2 && x6 == "maybe" && x7 == 0
./tests/codeGen/should_run/cgrun074.hs:main = print (sum (concat (map longlistof [1..100])))
./tests/codeGen/should_run/cgrun040.hs:main = print (f2 (f3 (f1 3)) 4)
./tests/codeGen/should_run/cgrun011.hs:main = print foO
./tests/codeGen/should_run/cgrun001.hs:main = print ( f () )
./tests/codeGen/should_run/cgrun050.hs:main = print (f (VFn (F $ (\x -> VInt (x+3)))))
./tests/codeGen/should_run/T14754.hs:main = print (alg 3 1)
./tests/codeGen/should_run/cgrun060.hs:main = print (sim (replicate 100000 ()))
./tests/codeGen/should_run/cgrun054.hs:main = print (map bar [WithY X2, A4, A5])
./tests/codeGen/should_run/cgrun005.hs:main = print foo
./tests/codeGen/should_run/T1852.hs:main = print traceList
./tests/codeGen/should_run/cgrun014.hs:main = print ((show ( (-42) :: Float )) ++ " " ++ (show ( (-42) :: Double )) ++ "\n")
./tests/codeGen/should_run/cgrun020.hs:main = print ((read "-1") :: Integer)
./tests/codeGen/should_run/cgrun004.hs:main = print (length ([9,8,7,6,5,4,3,2,1] :: [Int]))
./tests/codeGen/should_run/T2838.hs:main = print (complement (-1))
./tests/codeGen/should_run/cgrun010.hs:main = print a
./tests/codeGen/should_run/cgrun051.hs:main = print (case (T2 (error "OK") 1) of { T2 x y -> y })
./tests/codeGen/should_run/T15696_3.hs:main = print $
./tests/codeGen/should_run/T16449_2.hs:main = print (I# (uncheckedIShiftL# 1# 1000#))
./tests/codeGen/should_run/T9013.hs:main = print carry
./tests/codeGen/should_run/T9001.hs:main = print (delete 2000 (FM id) :: Int)
./tests/codeGen/should_run/T9533c.hs:main = print (f (read "0"))
./tests/codeGen/should_run/T20640b.hs:main = print (foo 0xce) -- 0xce=206
./tests/codeGen/should_run/cgrun039.hs:main = print ("hurrah" `poly` "Hello, world!\n")
./tests/codeGen/should_run/T13425.hs:main = print (flags 255)
./tests/codeGen/should_run/cgrun019.hs:main = print (1.234e5 :: Float)
./tests/codeGen/should_run/cgrun048.hs:main = print (map f [1 .. 7])
./tests/codeGen/should_run/T15696_1.hs:main = print (cmpT a T2)
./tests/codeGen/should_run/cgrun058.hs:main = print test
./tests/codeGen/should_run/cgrun009.hs:main = print (length take_list)
./tests/codeGen/should_run/PopCnt.hs:main = print (I# (popcnt32 0xffff#))
./tests/codeGen/should_run/cgrun018.hs:main = print (selectee1 + selectee2)
./tests/codeGen/should_run/cgrun049.hs:main = print (g (f t))
./tests/codeGen/should_run/cgrun008.hs:main = print (length comp_list)
./tests/codeGen/should_run/T7361.hs:main = print $ map f [1,256,65536,minBound,maxBound]
./tests/codeGen/should_run/T14619.hs:main = print $ sphereIntersection (11, 22, 33) (44, 55, 66)
./tests/codeGen/should_run/T10521b.hs:main = print (h 1.0)
./tests/codeGen/should_run/T9577.hs:main = print (foo == Ptr "foo"#)
./tests/codeGen/should_run/cgrun007.hs:main = print (height our_tree)
./tests/codeGen/should_run/cgrun003.hs:main = print (id2 (id2 id2) (42::Int))
./tests/codeGen/should_run/T3561.hs:main = print $ pqr' 0 1
./tests/codeGen/should_run/T3677.hs:main = print (take 2 (edi2 0))
./tests/codeGen/should_run/cgrun012.hs:main = print foo
./tests/codeGen/should_run/T5747.hs:main = print (cos 0)
./tests/codeGen/should_run/cgrun002.hs:main = print ((f id2) (10 + thirty_two))
./tests/codeGen/should_run/T5149.hs:main = print (I# (f 1# 2# 1.0##))
./tests/codeGen/should_run/T2080.hs:main = print (utf8DecodeChar# "\128"# False) -- should be False
./tests/codeGen/should_run/cgrun006.hs:main = print (length thirteen_ones)
./tests/deriving/should_run/drvrun001.hs:main = print (MkAge 3 + MkAge 5)
./tests/deriving/should_run/drvrun-foldable1.hs:main = print (sum someList)
./tests/deriving/should_run/drvrun015.hs:main = print (show (read "Obj {_id=1,p1=10,p2=20}" :: Obj))
./tests/deriving/should_run/drvrun014.hs:main = print (Str "ab" == (Str "a" :+ Str "b"))
./tests/deriving/should_run/drvrun020.hs:main = print (read "3 :%% T2 T1 { f1=3 }" :: T)
./tests/deriving/should_run/T4528a.hs:main = print [A ..]
./tests/deriving/should_run/T5041.hs:main = print foo
./tests/deriving/should_run/T10598_bug.hs:main = print $ fmap (+1) $ MyMaybe $ Just (10 :: Int)
./tests/deriving/should_run/T5628.hs:main = print (g == g)
./tests/deriving/should_run/T7931.hs:main = print (read "[]" :: [A])
./tests/deriving/should_run/drvrun017.hs:main = print (MkFoo 3# 4.3# 2)
./tests/deriving/should_run/drvrun013.hs:main = print (MkA (MkB 1) == MkA (MkB 2))
./tests/deriving/should_run/drvrun012.hs:main = print (read "Foo { x = 1 :%% 2, y = Just 4 }" :: Foo)
./tests/deriving/should_run/T5712.hs:main = print ('x' :+: (3 :*: True))
./tests/cpranal/should_run/T20598c.hs:main = print $ toValue [Number 1]
./tests/cpranal/should_run/CPRRepeat.hs:main = print (repeat' () !! 10 )
./tests/overloadedrecflds/should_run/T17551b.hs:main = print $
./tests/overloadedrecflds/should_run/T11228.hs:main = print (f e)
./tests/overloadedrecflds/should_run/overloadedrecfldsrun02.hs:main = print (y u)
./tests/overloadedrecflds/should_run/overloadedrecfldsrun01.hs:main = print (get_x b)
./tests/type-data/should_run/T22332a.hs:main = print (uc 'a' :: Int)
./tests/numeric/should_run/arith019.hs:main = print (i * i)
./tests/numeric/should_run/T22282.hs:main = print $ testF 217 161
./tests/numeric/should_run/NumDecimals.hs:main = print (1.2e6 :: Integer)
./tests/numeric/should_run/arith006.hs:main = print ((fromIntegral (42 :: Int)) :: Float)
./tests/numeric/should_run/T1603.hs:main = print (syn [-1])
./tests/numeric/should_run/T4383.hs:main = print (0.5 ^ 1030)
./tests/numeric/should_run/numrun010.hs:main = print val
./tests/numeric/should_run/T9407.hs:main = print $ foldl combine Nothing [Sphere (Vec3 0 0 0) 1]
./tests/numeric/should_run/numrun011.hs:main = print (fromRational (1 % 85070591730234615865843651857942052864) :: Float)
./tests/numeric/should_run/T18604.hs:main = print (n - s)
./tests/overloadedstrings/should_run/overloadedstringsrun01.hs:main = print $ "hello" ++ " world."
./tests/mdo/should_run/mdorun002.hs:main = print test
./tests/primops/should_run/T10481.hs:main = print (I# (f Overflow))
./tests/primops/should_run/T21624.hs:main = print (mulIntMayOflo maxBound 0x4)
./tests/stranal/should_run/T10218.hs:main = print (fst p + snd p)
./tests/stranal/should_run/strun002.hs:main = print (is_volatile [] ("hello",2))
./tests/stranal/should_run/T9254.hs:main = print (g 1)
./tests/stranal/should_run/T22475b.hs:main = print $ run (Cfg 0 (Just 1)) 13
./tests/stranal/should_run/strun004.hs:main = print (f 300)
./tests/stranal/should_run/strun001.hs:main = print (g True 'a' True)
./tests/stranal/should_run/T11076.hs:main = print (testBool x) `catch`
./tests/stranal/should_run/T8425/Main.hs:main = print $ isGood $ mkLin (array (1,1) [ (1,array (3,3) [(3, 42)]) ]!!!1)
./tests/stranal/should_run/T23208.hs:main = print $ g (15 :: Int)
./tests/stranal/should_run/T22549.hs:main = print (example == example)
./tests/ffi/should_run/ffi_parsing_001.hs:main = print x
./tests/ffi/should_run/ffi022.hs:main = print =<< getProgName
./tests/profiling/should_run/prof-doc-fib.hs:main = print (f 30 + g 30)
./tests/profiling/should_run/profinline001.hs:main = print (f 42)
./tests/profiling/should_run/T14257.hs:main = print (eval (||) False (True : replicate 10000000 False))
./tests/profiling/should_run/T3001.hs:main = print $ replicate 40000 'x'
./tests/profiling/should_run/ignore_scc.hs:main = print (f 20 30)
./tests/profiling/should_run/T5559.hs:main = print (føb 26)
./tests/profiling/should_run/ioprof.hs:main = print (runM (bar ["a","b"]) "state")
./tests/profiling/should_run/scc002.hs:main = print (yan 30 + yan 40)
./tests/profiling/should_run/T11627a.hs:main = print $ length $ show (foldl' (*) 1 [1..100000] :: Integer)
./tests/profiling/should_run/T680.hs:main = print r
./tests/profiling/should_run/scc003.hs:main = print (f 20 30)
./tests/simplCore/should_run/T9128.hs:main = print (f (MkT id))
./tests/simplCore/should_run/simplrun009.hs:main = print (sum (foo [[1,2], [3,4,5]]))
./tests/simplCore/should_run/T3437.hs:main = print (go [100000000] [])
./tests/simplCore/should_run/T13429.hs:main = print $ prop_mappend z z
./tests/simplCore/should_run/T22998.hs:main = print x
./tests/simplCore/should_run/UnliftedArgRule.hs:main = print (f (z# 3))
./tests/simplCore/should_run/T17744.hs:main = print $ completeResults $ feed "f" $ parse uriScheme
./tests/simplCore/should_run/T3959.hs:main = print =<< test
./tests/simplCore/should_run/T7101.hs:main = print (let ?x = 0 in f h True)
./tests/simplCore/should_run/T15436.hs:main = print [ succ (x :: Z) | x <- [minBound .. pred maxBound] ]
./tests/simplCore/should_run/SeqRule.hs:main = print (seq (f True) False)
./tests/simplCore/should_run/T18012.hs:main = print (g ())
./tests/simplCore/should_run/simplrun002.hs:main = print (myFst (sndSnd (True, (False,True))))
./tests/simplCore/should_run/T14868.hs:main = print (4, "foo")
./tests/simplCore/should_run/T23184.hs:main = print $ noinline (\x -> sum $ tardisManual [0..x]) 0
./tests/simplCore/should_run/simplrun005.hs:main = print (fib' 100)
./tests/simplCore/should_run/T13429_2.hs:main = print $ arr2 $ makeArray 1600 id
./tests/simplCore/should_run/T4814.hs:main = print $ f (foo (baz 1)) (foo (baz 2))
./tests/simplCore/should_run/simplrun001.hs:main = print (length (filter (not . foo)
./tests/simplCore/should_run/T15840.hs:main = print (f (MkT True))
./tests/simplCore/should_run/simplrun004.hs:main = print (sum $ sucW 11,sum $ sucW 12)
./tests/simplCore/should_run/T5997.hs:main = print $ incompleteBetaWorker 0
./tests/simplCore/should_run/T5587.hs:main = print $ seq (head (map (\a -> \b -> hiddenError) (hiddenError::[] Bool))) id [1]
./tests/simplCore/should_run/T5587.hs:main = print $ seq (head (map f he)) id [1]
./tests/simplCore/should_run/T5915.hs:main = print (test [0])
./tests/simplCore/should_run/T5920.hs:main = print $ goInt 1 1
./tests/simplCore/should_run/T11172.hs:main = print $ ks_X3Sb (Left ())
./tests/simplCore/should_run/T14965.hs:main = print $ cc bb
./tests/simplCore/should_run/T21229.hs:main = print $ h @'T 0 (\ _ a -> a)
./tests/deSugar/should_run/T12595.hs:main = print (let !x = maxInt in even x)
./tests/deSugar/should_run/dsrun011.hs:main = print (a1 3)
./tests/deSugar/should_run/T11601.hs:main = print (f False)
./tests/deSugar/should_run/dsrun005.hs: main = print (f True "" "Hallo")
./tests/deSugar/should_run/dsrun005.hs: main = print (f True "" "Hallo")
./tests/deSugar/should_run/dsrun005.hs:main = print (f True "" "Hallo")
./tests/deSugar/should_run/dsrun014.hs:main = print (g (trace "one" 1) (trace "two" 2))
./tests/deSugar/should_run/dsrun004.hs:main = print (f 3) >>
./tests/deSugar/should_run/dsrun007.hs:main = print (unpick (C{}))
./tests/deSugar/should_run/T11747.hs:main = print (zero @())
./tests/deSugar/should_run/dsrun013.hs:main = print (foo [] "ok")
./tests/deSugar/should_run/dsrun003.hs:main = print (isFemale (Female {firstName = "Jane", lastName = "Smith"}))
./tests/deSugar/should_run/dsrun012.hs:main = print a62
./tests/deSugar/should_run/T8952.hs:main = print (case Nothing of
./tests/deSugar/should_run/dsrun006.hs:main = print (f (A {a = 3}))
./tests/deSugar/should_run/dsrun009.hs:main = print (minusTwo,trueOrFalse)
./tests/deSugar/should_run/DsLambdaCase.hs:main = print $ [ f (Just 1) (Left "Y") == Just (1, "Y")
./tests/deSugar/should_run/dsrun008.hs:main = print (case (1,2) of ~(~(2,x)) -> x)
./tests/typecheck/should_run/T3500b.hs:main = print (showMu item)
./tests/typecheck/should_run/T11120.hs:main = print $ typeRep (Proxy :: Proxy 'CharHash)
./tests/typecheck/should_run/mc17.hs:main = print (f [0..10])
./tests/typecheck/should_run/T1735_Help/Main.hs:main = print rigidManualTests
./tests/typecheck/should_run/T1735.hs:main = print rigidManualTests
./tests/typecheck/should_run/T8739.hs:main = print (lazy (I# (go $ ())))
./tests/typecheck/should_run/tcrun015.hs:main = print (take 10 (map getPatNames (repeat (InP (One "n", 1)))))
./tests/typecheck/should_run/T9858d.hs:main = print $ typeRep (Proxy :: Proxy A) == typeRep (Proxy :: Proxy 'A)
./tests/typecheck/should_run/tcrun011.hs:main = print [foo (3::Int) x | MkGeneral x <- xs]
./tests/typecheck/should_run/tcrun050.hs:main = print $ case f (\x -> g (# x, x + 1 #)) 10 of (# y, z #) -> y + z
./tests/typecheck/should_run/tcrun001.hs:main = print (twice inc 2)
./tests/typecheck/should_run/tcrun010.hs:main = print (show foo)
./tests/typecheck/should_run/testeq2.hs:main = print $ ( typeEq "42" "88"
./tests/typecheck/should_run/T19667.hs:main = print $ reifySymbol "Hello World" symbolVal
./tests/typecheck/should_run/tcrun051.hs:main = print $ h g
./tests/typecheck/should_run/T8492.hs:main = print $ x 0
./tests/typecheck/should_run/tcrun014.hs:main = print (get (plus1 (InPE (Many [], 0))))
./tests/typecheck/should_run/tcrun020.hs:main = print test
./tests/typecheck/should_run/tcrun030.hs:main = print (foo == foo)
./tests/typecheck/should_run/tcrun042.hs:main = print ( dropFunction (e "Meh" (flip const))
./tests/typecheck/should_run/tcrun013.hs:main = print (f [0..10])
./tests/typecheck/should_run/TcNullaryTC.hs:main = print (g (f 0))
./tests/typecheck/should_run/TcTypeNatSimpleRun.hs:main = print [ sh (tsub (Proxy :: Proxy 5) (Proxy :: Proxy 3)) == "2"
./tests/typecheck/should_run/tcrun046.hs:main = print (f g 4)
./tests/typecheck/should_run/tcrun033.hs:main = print ((sat :: Int -> String -> String) 3 "hello")
./tests/typecheck/should_run/T9858c.hs:main = print (test1,test2)
./tests/typecheck/should_run/tcrun016.hs:main = print (get ((AttributeLeaf (MyLabel "x") 4)::Env1) (MyLabel "x"))
./tests/typecheck/should_run/tcrun047.hs:main = print $ g (Ex (# 10, f (# 20, 30 #) #))
./tests/typecheck/should_run/tcrun006.hs:main = print (newout (NewIn "ok new") ++ dataout (DataIn " ok data"))
./tests/typecheck/should_run/T5759.hs:main = print d
./tests/typecheck/should_run/tcrun026.hs:main = print sample
./tests/typecheck/should_run/TcTypeSymbolSimpleRun.hs:main = print [ symbolVal (tappend (Proxy :: Proxy "abc") (Proxy :: Proxy "ab"))
./tests/typecheck/should_run/tcrun019.hs:main = print (let ?x = 0 in f h 10)
./tests/typecheck/should_run/T5570.hs:main = print $ D# $ 3.0##
./tests/typecheck/should_run/tcrun009.hs:main = print (test3 "foo")
./tests/typecheck/should_run/T14925.hs:main = print $ typeOf Ω
./tests/typecheck/should_run/T5573a.hs:main = print $ foo3 (# if b then x + y else x - y, 30 #)
./tests/typecheck/should_run/tcrun029.hs:main = print (insert 1 2 None)
./tests/typecheck/should_run/church.hs:main = print ((3+4)*12 - 10::Ch)
./tests/typecheck/should_run/tcrun028.hs:main = print t
./tests/typecheck/should_run/T3500a.hs:main = print (f (3 :: Int))
./tests/typecheck/should_run/tcrun038.hs:main = print (bar (3::Int))
./tests/typecheck/should_run/Defer01.hs:main = print "No errors!"
./tests/typecheck/should_run/tcrun049.hs:main = print $ case f2 (\x -> (# x, x + 1 #)) 10 of (# y, z #) -> y + z
./tests/dependent/should_run/T11311.hs:main = print foo
./tests/simplStg/should_run/T13536.hs:main = print (foo False 1)
./tests/perf/should_run/T7507.hs:main = print $ sum $ map bitcount
./tests/perf/should_run/T7797.hs:main = print $ case box of
./tests/perf/should_run/T4978.hs:main = print $ L.length $ toLazyByteString $ test 10000000
./tests/perf/should_run/T7436.hs:main = print $ foldr (\x y -> y) "end" (mkList n)
./tests/perf/should_run/T18574.hs:main = print $ even $ sum $ catMaybes $ map xx ([1..100000000] :: [Int])
./tests/perf/should_run/T4474a.hs:main = print $ sumList $ flatListCons $ fullTree 26
./tests/perf/should_run/MethSharing.hs:main = print $ loop 1 (replicate 10000000 5)
./tests/perf/should_run/MethSharing.hs:main = print $ loop 1 (replicate 10000000 5)
./tests/perf/should_run/T2902_A.hs:main = print $ take 20 $ toList $ f 20
./tests/perf/should_run/T5237.hs:main = print (fun 1e7)
./tests/perf/should_run/T149_B.hs:main = print $ playerMostOccur2 [1..m]
./tests/perf/should_run/T8472.hs:main = print $ x `mod` 2 == (x + 4) `mod` 2
./tests/perf/should_run/T4830.hs:main = print (foo 1000000 (Just (1,2)))
./tests/perf/should_run/T3738.hs:main = print (bar 2 !! 10000)
./tests/perf/should_run/T149_A.hs:main = print $ playerMostOccur1 [1..m]
./tests/perf/should_run/T9203.hs:main = print (f 50000 () == f 50001 ())
./tests/perf/should_run/T5113.hs:main = print (divisorCounts 1000000 ! 342)
./tests/perf/should_run/DeriveNull.hs:main = print $ long (10^(6 :: Int))
./tests/perf/should_run/T2902_B.hs:main = print $ take 20 $ toList $ f 20
./tests/perf/should_run/T3586.hs:main = print $ runST
./tests/perf/should_run/T7954.hs:main = print (norm (enumFromTo 0 10000000) > 100)
./tests/perf/should_run/T4474b.hs:main = print $ sumList $ flatListCons2 $ fullTree 26
./tests/perf/should_run/T19347.hs:main = print (foo (MkT (case g 1 200 of (# a,b #) -> a))
./tests/perf/should_run/T7436b.hs:main = print $ sumList . fmap id $ mkList n
./tests/perf/should_run/T14955.hs:main = print (test3 (replicate 1000000 False))
./tests/perf/should_run/T7850.hs:main = print $ ack 4 1
./tests/perf/should_run/T9339.hs:main = print $ last $ filter odd $ [1::Int ..10000000]
./tests/perf/should_run/T5835.hs:main = print (go (T [1::Int]) 20000)
./tests/perf/should_run/T12791.hs:main = print $ go (0 :: Int) 20000
./tests/perf/should_run/T4474c.hs:main = print $ sumList $ flatListCons3 $ fullTree 26
./tests/ghci/should_run/ghcirun004.hs:main = print (map foo [1,50..5000] )
./tests/ghci/should_run/ghcirun001.hs:main = print (bceFour E E)
./tests/ghci/should_run/UnliftedDataType2.hs:main = print $ member 42 set
./tests/ghci/should_run/T2881.hs:main = print (fib 20)
./tests/ghci/should_run/ghcirun002.hs:main = print (makeSpiral 10000)
./tests/ghci/should_run/T2589.hs:main = print (Ptr nullAddr# == nullPtr)
./tests/ghci/should_run/ghcirun003.hs:main = print ok
./tests/patsyn/should_run/records-poly-update.hs:main = print p6
./tests/indexed-types/should_run/T11465a.hs:main = print $ boxed 'c'#
./tests/indexed-types/should_run/T2985.hs:main = print test1
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment