Skip to content
Snippets Groups Projects
Commit b09e6958 authored by Zubin's avatar Zubin Committed by Marge Bot
Browse files

testsuite: Add test for #24327

parent b35dd613
No related branches found
No related tags found
No related merge requests found
module T24327 where
import T24327A
bar :: Int
bar = foo1 'a' 1
:l T24327
module T24327A where
{-# INLINE foo1 #-}
foo1 :: Char -> Int -> Int
foo1 _ y = bar1 y
{-# INLINE bar1 #-}
bar1 :: Int -> Int
bar1 x = length [1..10] + x
test('T24327', [extra_ways(['ghci-ext-prof']), only_ways(['ghci-ext-prof']), extra_files(['T24327A.hs', 'T24327.hs']), extra_hc_opts('-fno-unoptimized-core-for-interpreter -O')], ghci_script, ['T24327.script'])
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