universum-0.3: Custom prelude used in Serokell

Safe HaskellTrustworthy
LanguageHaskell2010

Debug

Synopsis

Documentation

undefined :: a Source #

Warning: undefined function remains in code (or use error)

error :: Text -> a Source #

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: traceId 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

data Undefined Source #

Warning: Undefined type remains in code

Constructors

Undefined

Warning: Undefined type remains in code

Instances

Bounded Undefined Source # 
Enum Undefined Source # 
Eq Undefined Source # 
Data Undefined Source # 

Methods

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

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

toConstr :: Undefined -> Constr #

dataTypeOf :: Undefined -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Undefined Source # 
Read Undefined Source # 
Show Undefined Source # 
Generic Undefined Source # 

Associated Types

type Rep Undefined :: * -> * #

type Rep Undefined Source # 
type Rep Undefined = D1 (MetaData "Undefined" "Debug" "universum-0.3-1FLfFMqxT1cGEf7YHIL2bX" False) (C1 (MetaCons "Undefined" PrefixI False) U1)