{-# LANGUAGE CPP, DataKinds, FlexibleContexts, FlexibleInstances,
KindSignatures, TypeFamilies, UndecidableInstances #-}
module Data.EnumMap
( module Data.EnumMap.Lazy
#ifdef __GLASGOW_HASKELL__
, insertWith'
, insertWithKey'
, fold
, foldWithKey
#endif
) where
import Data.EnumMap.Lazy
#ifdef __GLASGOW_HASKELL__
import GHC.TypeLits
class Whoops (a :: Symbol)
#if __GLASGOW_HASKELL__ >= 800
instance TypeError ('Text a) => Whoops a
#endif
insertWith' :: Whoops "Data.EnumMap.insertWith' is gone. Use Data.EnumMap.Strict.insertWith."
=> (a -> a -> a) -> k -> a -> EnumMap k a -> EnumMap k a
insertWith' :: forall a k.
Whoops
"Data.EnumMap.insertWith' is gone. Use Data.EnumMap.Strict.insertWith." =>
(a -> a -> a) -> k -> a -> EnumMap k a -> EnumMap k a
insertWith' a -> a -> a
_ k
_ a
_ EnumMap k a
_ = forall a. HasCallStack => a
undefined
insertWithKey' :: Whoops "Data.EnumMap.insertWithKey' is gone. Use Data.EnumMap.Strict.insertWithKey."
=> (k -> a -> a -> a) -> k -> a -> EnumMap k a -> EnumMap k a
insertWithKey' :: forall k a.
Whoops
"Data.EnumMap.insertWithKey' is gone. Use Data.EnumMap.Strict.insertWithKey." =>
(k -> a -> a -> a) -> k -> a -> EnumMap k a -> EnumMap k a
insertWithKey' k -> a -> a -> a
_ k
_ a
_ EnumMap k a
_ = forall a. HasCallStack => a
undefined
fold :: Whoops "Data.EnumMap.fold' is gone. Use Data.EnumMap.foldr or Prelude.foldr."
=> (a -> b -> b) -> b -> EnumMap k a -> b
fold :: forall a b k.
Whoops
"Data.EnumMap.fold' is gone. Use Data.EnumMap.foldr or Prelude.foldr." =>
(a -> b -> b) -> b -> EnumMap k a -> b
fold a -> b -> b
_ b
_ EnumMap k a
_ = forall a. HasCallStack => a
undefined
foldWithKey :: Whoops "Data.EnumMap.foldWithKey is gone. Use foldrWithKey."
=> (k -> a -> b -> b) -> b -> EnumMap k a -> b
foldWithKey :: forall k a b.
Whoops "Data.EnumMap.foldWithKey is gone. Use foldrWithKey." =>
(k -> a -> b -> b) -> b -> EnumMap k a -> b
foldWithKey k -> a -> b -> b
_ b
_ EnumMap k a
_ = forall a. HasCallStack => a
undefined
#endif