purescript-0.9.3: PureScript Programming Language Compiler

Safe HaskellNone
LanguageHaskell98

Language.PureScript.Ide.Types

Description

Type definitions for psc-ide

Documentation

newtype AstData a Source #

Constructors

AstData (Map ModuleName (Map (Either Text Text) a)) 

Instances

Functor AstData Source # 

Methods

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

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

Foldable AstData Source # 

Methods

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

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

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

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

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

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

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

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

toList :: AstData a -> [a] #

null :: AstData a -> Bool #

length :: AstData a -> Int #

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

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

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

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

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

Eq a => Eq (AstData a) Source # 

Methods

(==) :: AstData a -> AstData a -> Bool #

(/=) :: AstData a -> AstData a -> Bool #

Ord a => Ord (AstData a) Source # 

Methods

compare :: AstData a -> AstData a -> Ordering #

(<) :: AstData a -> AstData a -> Bool #

(<=) :: AstData a -> AstData a -> Bool #

(>) :: AstData a -> AstData a -> Bool #

(>=) :: AstData a -> AstData a -> Bool #

max :: AstData a -> AstData a -> AstData a #

min :: AstData a -> AstData a -> AstData a #

Show a => Show (AstData a) Source # 

Methods

showsPrec :: Int -> AstData a -> ShowS #

show :: AstData a -> String #

showList :: [AstData a] -> ShowS #

data Stage2 Source #

Constructors

Stage2 

newtype Match a Source #

Constructors

Match (ModuleName, a) 

Instances

Functor Match Source # 

Methods

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

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

Eq a => Eq (Match a) Source # 

Methods

(==) :: Match a -> Match a -> Bool #

(/=) :: Match a -> Match a -> Bool #

Show a => Show (Match a) Source # 

Methods

showsPrec :: Int -> Match a -> ShowS #

show :: Match a -> String #

showList :: [Match a] -> ShowS #

newtype Info Source #

Constructors

Info (Text, Text, Text, Maybe SourceSpan) 

Instances

Eq Info Source # 

Methods

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

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

Show Info Source # 

Methods

showsPrec :: Int -> Info -> ShowS #

show :: Info -> String #

showList :: [Info] -> ShowS #

ToJSON Info Source # 

data PursuitResponse Source #

Constructors

ModuleResponse ModuleIdent Text

A Pursuit Response for a module. Consists of the modules name and the package it belongs to

DeclarationResponse Text ModuleIdent Text Text

A Pursuit Response for a declaration. Consist of the declarations type, module, name and package