Skip to content
Snippets Groups Projects
Forked from Glasgow Haskell Compiler / GHC
10823 commits behind the upstream repository.
Code owners
Assign users and groups as approvers for specific file changes. Learn more.
staticcallstack001.hs 268 B
module Main where

import GHC.Stack.CCS

data D = D Int deriving Show

ff = id (D 5)
{-# NOINLINE ff #-}
{-# NOINLINE qq #-}

qq x = D x

caf = D 5

main = do
  print . tail =<< whereFrom (D 5)
  print . tail =<< whereFrom caf
  print . tail =<< whereFrom (id (D 5))