floskell-0.9.0: A flexible Haskell source code pretty printer

Safe HaskellNone
LanguageHaskell98

Floskell.Types

Description

All types.

Synopsis

Documentation

newtype Penalty Source #

Constructors

Penalty Int 
Instances
Eq Penalty Source # 
Instance details

Defined in Floskell.Types

Methods

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

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

Num Penalty Source # 
Instance details

Defined in Floskell.Types

Ord Penalty Source # 
Instance details

Defined in Floskell.Types

Show Penalty Source # 
Instance details

Defined in Floskell.Types

Semigroup Penalty Source # 
Instance details

Defined in Floskell.Types

Monoid Penalty Source # 
Instance details

Defined in Floskell.Types

MonadSearch Penalty Printer Source # 
Instance details

Defined in Floskell.Types

newtype TabStop Source #

Constructors

TabStop String 
Instances
Eq TabStop Source # 
Instance details

Defined in Floskell.Types

Methods

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

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

Ord TabStop Source # 
Instance details

Defined in Floskell.Types

Show TabStop Source # 
Instance details

Defined in Floskell.Types

newtype Printer a Source #

A pretty printing monad.

Constructors

Printer 
Instances
Monad Printer Source # 
Instance details

Defined in Floskell.Types

Methods

(>>=) :: Printer a -> (a -> Printer b) -> Printer b #

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

return :: a -> Printer a #

fail :: String -> Printer a #

Functor Printer Source # 
Instance details

Defined in Floskell.Types

Methods

fmap :: (a -> b) -> Printer a -> Printer b #

(<$) :: a -> Printer b -> Printer a #

Applicative Printer Source # 
Instance details

Defined in Floskell.Types

Methods

pure :: a -> Printer a #

(<*>) :: Printer (a -> b) -> Printer a -> Printer b #

liftA2 :: (a -> b -> c) -> Printer a -> Printer b -> Printer c #

(*>) :: Printer a -> Printer b -> Printer b #

(<*) :: Printer a -> Printer b -> Printer a #

Alternative Printer Source # 
Instance details

Defined in Floskell.Types

Methods

empty :: Printer a #

(<|>) :: Printer a -> Printer a -> Printer a #

some :: Printer a -> Printer [a] #

many :: Printer a -> Printer [a] #

MonadPlus Printer Source # 
Instance details

Defined in Floskell.Types

Methods

mzero :: Printer a #

mplus :: Printer a -> Printer a -> Printer a #

MonadSearch Penalty Printer Source # 
Instance details

Defined in Floskell.Types

MonadState PrintState Printer Source # 
Instance details

Defined in Floskell.Types

data PrintState Source #

The state of the pretty printer.

Constructors

PrintState 

Fields

Instances
MonadState PrintState Printer Source # 
Instance details

Defined in Floskell.Types

data Style Source #

A printer style.

Constructors

Style 

Fields

data FlexConfig Source #

Instances
Generic FlexConfig Source # 
Instance details

Defined in Floskell.Config

Associated Types

type Rep FlexConfig :: Type -> Type #

ToJSON FlexConfig Source # 
Instance details

Defined in Floskell.Config

FromJSON FlexConfig Source # 
Instance details

Defined in Floskell.Config

Default FlexConfig Source # 
Instance details

Defined in Floskell.Config

Methods

def :: FlexConfig #

type Rep FlexConfig Source # 
Instance details

Defined in Floskell.Config

data NodeInfo Source #

Information for each node in the AST.

Constructors

NodeInfo 

Fields

Instances
Show NodeInfo Source # 
Instance details

Defined in Floskell.Types

data ComInfo Source #

Comment with some more info.

Constructors

ComInfo 

Fields

Instances
Show ComInfo Source # 
Instance details

Defined in Floskell.Types

data Location Source #

Constructors

Before 
After 
Instances
Bounded Location Source # 
Instance details

Defined in Floskell.Config

Enum Location Source # 
Instance details

Defined in Floskell.Config

Eq Location Source # 
Instance details

Defined in Floskell.Config

Ord Location Source # 
Instance details

Defined in Floskell.Config

Show Location Source # 
Instance details

Defined in Floskell.Config

Generic Location Source # 
Instance details

Defined in Floskell.Config

Associated Types

type Rep Location :: Type -> Type #

Methods

from :: Location -> Rep Location x #

to :: Rep Location x -> Location #

type Rep Location Source # 
Instance details

Defined in Floskell.Config

type Rep Location = D1 (MetaData "Location" "Floskell.Config" "floskell-0.9.0-inplace" False) (C1 (MetaCons "Before" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "After" PrefixI False) (U1 :: Type -> Type))