universum-0.1.12: Custom prelude used in Serokell

Safe HaskellTrustworthy
LanguageHaskell2010

Debug

Synopsis

Documentation

undefined :: a Source #

Warning: undefined remains in code (or use panic)

error :: Text -> a Source #

Warning: error remains in code (or use panic)

trace :: Print b => b -> a -> a Source #

Warning: trace remains in code

traceM :: Monad m => Text -> m () Source #

Warning: traceM remains in code

traceId :: Text -> Text Source #

Warning: traceM remains in code

traceIO :: (Print b, MonadIO m) => b -> a -> m a Source #

Warning: traceIO remains in code

traceShow :: Show a => a -> b -> b Source #

Warning: traceShow remains in code

traceShowId :: Show a => a -> a Source #

Warning: traceShowId remains in code

traceShowM :: (Show a, Monad m) => a -> m () Source #

Warning: traceShowM remains in code

notImplemented :: a Source #

Warning: notImplemented remains in code

data NotImplemented Source #

Warning: NotImplemented remains in code

Constructors

NotImplemented

Warning: NotImplemented remains in code

Instances

Eq NotImplemented Source # 
Data NotImplemented Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NotImplemented -> c NotImplemented #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NotImplemented #

toConstr :: NotImplemented -> Constr #

dataTypeOf :: NotImplemented -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c NotImplemented) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NotImplemented) #

gmapT :: (forall b. Data b => b -> b) -> NotImplemented -> NotImplemented #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NotImplemented -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NotImplemented -> r #

gmapQ :: (forall d. Data d => d -> u) -> NotImplemented -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NotImplemented -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NotImplemented -> m NotImplemented #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NotImplemented -> m NotImplemented #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NotImplemented -> m NotImplemented #

Ord NotImplemented Source # 
Show NotImplemented Source # 
Generic NotImplemented Source # 

Associated Types

type Rep NotImplemented :: * -> * #

type Rep NotImplemented Source # 
type Rep NotImplemented = D1 (MetaData "NotImplemented" "Debug" "universum-0.1.12-LdsYKVtWKSi11rJeUgIm1v" False) (C1 (MetaCons "NotImplemented" PrefixI False) U1)