coformat-0.2.1.0: Generate clang-format config based on some existing code base

Safe HaskellNone
LanguageHaskell2010

Clang.Coformat.Util

Documentation

data Failure Source #

Instances
Eq Failure Source # 
Instance details

Defined in Clang.Coformat.Util

Methods

(==) :: Failure -> Failure -> Bool #

(/=) :: Failure -> Failure -> Bool #

Show Failure Source # 
Instance details

Defined in Clang.Coformat.Util

Generic Failure Source # 
Instance details

Defined in Clang.Coformat.Util

Associated Types

type Rep Failure :: Type -> Type #

Methods

from :: Failure -> Rep Failure x #

to :: Rep Failure x -> Failure #

CoHas UnexpectedFailure Failure Source # 
Instance details

Defined in Clang.Coformat.Util

CoHas ExpectedFailure Failure Source # 
Instance details

Defined in Clang.Coformat.Util

type Rep Failure Source # 
Instance details

Defined in Clang.Coformat.Util

type Rep Failure = D1 (MetaData "Failure" "Clang.Coformat.Util" "coformat-0.2.1.0-N4XCmh29ewAFCsFuF2Lqx" False) (C1 (MetaCons "ExpectedFailure" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ExpectedFailure)) :+: C1 (MetaCons "UnexpectedFailure" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 UnexpectedFailure)))

update :: Int -> (a -> a) -> [a] -> [a] Source #

forConcurrently' :: (MonadLoggerIO m, MonadError e m) => [a] -> (forall m'. (MonadLoggerIO m', MonadError e m') => a -> m' b) -> m [b] Source #

forConcurrentlyPooled :: (MonadLoggerIO m, MonadError e m, MonadReader r m, Has TaskGroup r) => [a] -> (forall m'. (MonadLoggerIO m', MonadReader r m', MonadError e m') => a -> m' b) -> m [b] Source #

convert :: MonadError e' m => (e -> e') -> ExceptT e m a -> m a Source #

subsetsN :: Natural -> [a] -> [[a]] Source #