cabal-fmt-0.1.9: Format .cabal files
CopyrightOleg Grenrus
LicenseGPL-3.0-or-later
Safe HaskellSafe-Inferred
LanguageHaskell2010

CabalFmt.Prelude

Description

Fat-prelude.

Synopsis
  • (&&&) :: Arrow a => a b c -> a b c' -> a b (c, c')
  • when :: Applicative f => Bool -> f () -> f ()
  • unless :: Applicative f => Bool -> f () -> f ()
  • void :: Functor f => f a -> f ()
  • bimap :: Bifunctor p => (a -> b) -> (c -> d) -> p a c -> p b d
  • toLower :: Char -> Char
  • partitionEithers :: [Either a b] -> ([a], [b])
  • toList :: Foldable t => t a -> [a]
  • traverse_ :: (Foldable t, Applicative f) => (a -> f b) -> t a -> f ()
  • asum :: (Foldable t, Alternative f) => t (f a) -> f a
  • for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f ()
  • on :: (b -> b -> c) -> (a -> b) -> a -> a -> c
  • (&) :: a -> (a -> b) -> b
  • intercalate :: [a] -> [[a]] -> [a]
  • sortOn :: Ord b => (a -> b) -> [a] -> [a]
  • sortBy :: (a -> a -> Ordering) -> [a] -> [a]
  • nub :: Eq a => [a] -> [a]
  • catMaybes :: [Maybe a] -> [a]
  • fromMaybe :: a -> Maybe a -> a
  • isJust :: Maybe a -> Bool
  • isNothing :: Maybe a -> Bool
  • data ByteString
  • fromUTF8BS :: ByteString -> String
  • toUTF8BS :: String -> ByteString
  • pack' :: Newtype o n => (o -> n) -> o -> n
  • unpack' :: Newtype o n => (o -> n) -> n -> o
  • data Set a
  • dropExtension :: FilePath -> FilePath
  • splitDirectories :: FilePath -> [FilePath]
  • catchError :: MonadError e m => m a -> (e -> m a) -> m a
  • throwError :: MonadError e m => e -> m a
  • traverseOf :: Applicative f => ((a -> f b) -> s -> f t) -> (a -> f b) -> s -> f t
  • over :: ASetter s t a b -> (a -> b) -> s -> t
  • view :: Getting a s a -> s -> a
  • _1 :: Functor f => (a -> f b) -> (a, c) -> f (b, c)

Control.Arrow

(&&&) :: Arrow a => a b c -> a b c' -> a b (c, c') #

Control.Monad

when :: Applicative f => Bool -> f () -> f () #

unless :: Applicative f => Bool -> f () -> f () #

void :: Functor f => f a -> f () #

Data.Bifunctor

bimap :: Bifunctor p => (a -> b) -> (c -> d) -> p a c -> p b d #

Data.Char

toLower :: Char -> Char #

Data.Either

partitionEithers :: [Either a b] -> ([a], [b]) #

Data.Foldable

toList :: Foldable t => t a -> [a] #

traverse_ :: (Foldable t, Applicative f) => (a -> f b) -> t a -> f () #

asum :: (Foldable t, Alternative f) => t (f a) -> f a #

for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f () #

Data.Function

on :: (b -> b -> c) -> (a -> b) -> a -> a -> c #

(&) :: a -> (a -> b) -> b #

Data.List

intercalate :: [a] -> [[a]] -> [a] #

sortOn :: Ord b => (a -> b) -> [a] -> [a] #

sortBy :: (a -> a -> Ordering) -> [a] -> [a] #

nub :: Eq a => [a] -> [a] #

Data.Maybe

catMaybes :: [Maybe a] -> [a] #

fromMaybe :: a -> Maybe a -> a #

isJust :: Maybe a -> Bool #

isNothing :: Maybe a -> Bool #

Packages

bytestring

data ByteString #

Instances

Instances details
Data ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

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

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

toConstr :: ByteString -> Constr

dataTypeOf :: ByteString -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString)

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

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString

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

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

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

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

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

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

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

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

fromString :: String -> ByteString

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

(<>) :: ByteString -> ByteString -> ByteString

sconcat :: NonEmpty ByteString -> ByteString

stimes :: Integral b => b -> ByteString -> ByteString

IsList ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Associated Types

type Item ByteString

Methods

fromList :: [Item ByteString] -> ByteString

fromListN :: Int -> [Item ByteString] -> ByteString

toList :: ByteString -> [Item ByteString]

Read ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

readsPrec :: Int -> ReadS ByteString

readList :: ReadS [ByteString]

readPrec :: ReadPrec ByteString

readListPrec :: ReadPrec [ByteString]

Show ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

showsPrec :: Int -> ByteString -> ShowS

show :: ByteString -> String

showList :: [ByteString] -> ShowS

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

rnf :: ByteString -> ()

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

(==) :: ByteString -> ByteString -> Bool

(/=) :: ByteString -> ByteString -> Bool

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Lift ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

lift :: Quote m => ByteString -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => ByteString -> Code m ByteString

type Item ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

type Item ByteString = Word8

Cabal

fromUTF8BS :: ByteString -> String #

toUTF8BS :: String -> ByteString #

pack' :: Newtype o n => (o -> n) -> o -> n #

unpack' :: Newtype o n => (o -> n) -> n -> o #

containers

data Set a #

Instances

Instances details
Foldable Set 
Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m

foldMap :: Monoid m => (a -> m) -> Set a -> m

foldMap' :: Monoid m => (a -> m) -> Set a -> m

foldr :: (a -> b -> b) -> b -> Set a -> b

foldr' :: (a -> b -> b) -> b -> Set a -> b

foldl :: (b -> a -> b) -> b -> Set a -> b

foldl' :: (b -> a -> b) -> b -> Set a -> b

foldr1 :: (a -> a -> a) -> Set a -> a

foldl1 :: (a -> a -> a) -> Set a -> a

toList :: Set a -> [a] #

null :: Set a -> Bool

length :: Set a -> Int

elem :: Eq a => a -> Set a -> Bool

maximum :: Ord a => Set a -> a

minimum :: Ord a => Set a -> a

sum :: Num a => Set a -> a

product :: Num a => Set a -> a

Eq1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftEq :: (a -> b -> Bool) -> Set a -> Set b -> Bool

Ord1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Set a -> Set b -> Ordering

Show1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Set a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Set a] -> ShowS

Lift a => Lift (Set a :: Type) 
Instance details

Defined in Data.Set.Internal

Methods

lift :: Quote m => Set a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Set a -> Code m (Set a)

(Data a, Ord a) => Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a)

toConstr :: Set a -> Constr

dataTypeOf :: Set a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a))

gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r

gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a)

Ord a => Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: Set a

mappend :: Set a -> Set a -> Set a

mconcat :: [Set a] -> Set a

Ord a => Semigroup (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a

sconcat :: NonEmpty (Set a) -> Set a

stimes :: Integral b => b -> Set a -> Set a

Ord a => IsList (Set a) 
Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a)

Methods

fromList :: [Item (Set a)] -> Set a

fromListN :: Int -> [Item (Set a)] -> Set a

toList :: Set a -> [Item (Set a)]

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

readsPrec :: Int -> ReadS (Set a)

readList :: ReadS [Set a]

readPrec :: ReadPrec (Set a)

readListPrec :: ReadPrec [Set a]

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS

show :: Set a -> String

showList :: [Set a] -> ShowS

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> ()

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==) :: Set a -> Set a -> Bool

(/=) :: Set a -> Set a -> Bool

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering

(<) :: Set a -> Set a -> Bool

(<=) :: Set a -> Set a -> Bool

(>) :: Set a -> Set a -> Bool

(>=) :: Set a -> Set a -> Bool

max :: Set a -> Set a -> Set a

min :: Set a -> Set a -> Set a

Newtype (Set a) (Set' sep wrapper a) 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

pack :: Set a -> Set' sep wrapper a

unpack :: Set' sep wrapper a -> Set a

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a

directory

dropExtension :: FilePath -> FilePath #

splitDirectories :: FilePath -> [FilePath] #

exceptions

catchError :: MonadError e m => m a -> (e -> m a) -> m a #

throwError :: MonadError e m => e -> m a #

Extras

Lens

traverseOf :: Applicative f => ((a -> f b) -> s -> f t) -> (a -> f b) -> s -> f t #

over :: ASetter s t a b -> (a -> b) -> s -> t #

view :: Getting a s a -> s -> a #

_1 :: Functor f => (a -> f b) -> (a, c) -> f (b, c) #