tokstyle-0.0.5: TokTok C code style checker

Safe HaskellNone
LanguageHaskell2010

Tokstyle.Cimple.Lexer

Documentation

data Alex a Source #

Instances
Monad Alex Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

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

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

return :: a -> Alex a #

fail :: String -> Alex a #

Functor Alex Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

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

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

Applicative Alex Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

pure :: a -> Alex a #

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

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

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

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

data AlexPosn Source #

Constructors

AlexPn !Int !Int !Int 
Instances
Eq AlexPosn Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Show AlexPosn Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Generic AlexPosn Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Associated Types

type Rep AlexPosn :: Type -> Type #

Methods

from :: AlexPosn -> Rep AlexPosn x #

to :: Rep AlexPosn x -> AlexPosn #

ToJSON AlexPosn Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

FromJSON AlexPosn Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

type Rep AlexPosn Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

data Lexeme text Source #

Constructors

L AlexPosn LexemeClass text 
Instances
Functor Lexeme Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

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

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

Foldable Lexeme Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

fold :: Monoid m => Lexeme m -> m #

foldMap :: Monoid m => (a -> m) -> Lexeme a -> m #

foldr :: (a -> b -> b) -> b -> Lexeme a -> b #

foldr' :: (a -> b -> b) -> b -> Lexeme a -> b #

foldl :: (b -> a -> b) -> b -> Lexeme a -> b #

foldl' :: (b -> a -> b) -> b -> Lexeme a -> b #

foldr1 :: (a -> a -> a) -> Lexeme a -> a #

foldl1 :: (a -> a -> a) -> Lexeme a -> a #

toList :: Lexeme a -> [a] #

null :: Lexeme a -> Bool #

length :: Lexeme a -> Int #

elem :: Eq a => a -> Lexeme a -> Bool #

maximum :: Ord a => Lexeme a -> a #

minimum :: Ord a => Lexeme a -> a #

sum :: Num a => Lexeme a -> a #

product :: Num a => Lexeme a -> a #

Traversable Lexeme Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

traverse :: Applicative f => (a -> f b) -> Lexeme a -> f (Lexeme b) #

sequenceA :: Applicative f => Lexeme (f a) -> f (Lexeme a) #

mapM :: Monad m => (a -> m b) -> Lexeme a -> m (Lexeme b) #

sequence :: Monad m => Lexeme (m a) -> m (Lexeme a) #

Eq text => Eq (Lexeme text) Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

(==) :: Lexeme text -> Lexeme text -> Bool #

(/=) :: Lexeme text -> Lexeme text -> Bool #

Show text => Show (Lexeme text) Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

showsPrec :: Int -> Lexeme text -> ShowS #

show :: Lexeme text -> String #

showList :: [Lexeme text] -> ShowS #

Generic (Lexeme text) Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Associated Types

type Rep (Lexeme text) :: Type -> Type #

Methods

from :: Lexeme text -> Rep (Lexeme text) x #

to :: Rep (Lexeme text) x -> Lexeme text #

ToJSON text => ToJSON (Lexeme text) Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

toJSON :: Lexeme text -> Value #

toEncoding :: Lexeme text -> Encoding #

toJSONList :: [Lexeme text] -> Value #

toEncodingList :: [Lexeme text] -> Encoding #

FromJSON text => FromJSON (Lexeme text) Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

Methods

parseJSON :: Value -> Parser (Lexeme text) #

parseJSONList :: Value -> Parser [Lexeme text] #

TraverseAst [Node (Lexeme Text)] Source # 
Instance details

Defined in Tokstyle.Cimple.TraverseAst

TraverseAst (Node (Lexeme Text)) Source # 
Instance details

Defined in Tokstyle.Cimple.TraverseAst

TraverseAst (Lexeme Text) Source # 
Instance details

Defined in Tokstyle.Cimple.TraverseAst

type Rep (Lexeme text) Source # 
Instance details

Defined in Tokstyle.Cimple.Lexer

lexemeText :: Lexeme text -> text Source #

mkL :: Applicative m => LexemeClass -> AlexInput -> Int -> m (Lexeme String) Source #