{-# LANGUAGE CPP, FlexibleContexts, DataKinds #-}
#if __GLASGOW_HASKELL__ >= 800
{-# LANGUAGE MonoLocalBinds #-}
#endif
#if __GLASGOW_HASKELL__ < 710
{-# LANGUAGE Trustworthy #-}
#endif
#include "containers.h"
module Data.Strict.Map.Autogen.Internal.DeprecatedShowTree where
import Data.Strict.Map.Autogen.Internal (Map)
import Data.Strict.ContainersUtils.Autogen.TypeError
showTree :: Whoops "showTree has moved to Data.Strict.Map.Autogen.Internal.Debug.showTree."
         => Map k a -> String
showTree :: forall k a.
Whoops
  "showTree has moved to Data.Strict.Map.Autogen.Internal.Debug.showTree." =>
Map k a -> String
showTree Map k a
_ = forall a. HasCallStack => a
undefined
showTreeWith ::
      Whoops "showTreeWith has moved to Data.Strict.Map.Autogen.Internal.Debug.showTreeWith."
   => (k -> a -> String) -> Bool -> Bool -> Map k a -> String
showTreeWith :: forall k a.
Whoops
  "showTreeWith has moved to Data.Strict.Map.Autogen.Internal.Debug.showTreeWith." =>
(k -> a -> String) -> Bool -> Bool -> Map k a -> String
showTreeWith k -> a -> String
_ Bool
_ Bool
_ Map k a
_ = forall a. HasCallStack => a
undefined