{-# LANGUAGE CPP, FlexibleContexts, DataKinds, MonoLocalBinds #-}
module Data.IntMap.Internal.DeprecatedDebug where
import Data.IntMap.Internal (IntMap)
import Utils.Containers.Internal.TypeError
showTree :: Whoops "Data.IntMap.showTree has moved to Data.IntMap.Internal.Debug.showTree"
=> IntMap a -> String
showTree :: forall a.
Whoops
"Data.IntMap.showTree has moved to Data.IntMap.Internal.Debug.showTree" =>
IntMap a -> String
showTree IntMap a
_ = String
forall a. HasCallStack => a
undefined
showTreeWith :: Whoops "Data.IntMap.showTreeWith has moved to Data.IntMap.Internal.Debug.showTreeWith"
=> Bool -> Bool -> IntMap a -> String
showTreeWith :: forall a.
Whoops
"Data.IntMap.showTreeWith has moved to Data.IntMap.Internal.Debug.showTreeWith" =>
Bool -> Bool -> IntMap a -> String
showTreeWith Bool
_ Bool
_ IntMap a
_ = String
forall a. HasCallStack => a
undefined