hsinspect-lsp-0.0.3: LSP interface over the hsinspect binary.

Safe HaskellNone
LanguageHaskell2010

HsInspect.LSP.HsInspect

Documentation

data Import Source #

Constructors

Import 

Fields

Instances
Eq Import Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Methods

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

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

Show Import Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Generic Import Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Associated Types

type Rep Import :: Type -> Type #

Methods

from :: Import -> Rep Import x #

to :: Rep Import x -> Import #

FromJSON Import Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Import Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Import = D1 (MetaData "Import" "HsInspect.LSP.HsInspect" "hsinspect-lsp-0.0.3-3bdJrSliDOAk0YsLeurki" False) (C1 (MetaCons "Import" PrefixI True) (S1 (MetaSel (Just "_local") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_qual") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_full") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text))))

data Package Source #

Instances
Eq Package Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Methods

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

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

Show Package Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Generic Package Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Associated Types

type Rep Package :: Type -> Type #

Methods

from :: Package -> Rep Package x #

to :: Rep Package x -> Package #

FromJSON Package Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Package Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

data Module Source #

Constructors

Module 

Fields

Instances
Eq Module Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Methods

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

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

Show Module Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Generic Module Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Associated Types

type Rep Module :: Type -> Type #

Methods

from :: Module -> Rep Module x #

to :: Rep Module x -> Module #

FromJSON Module Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Module Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Module = D1 (MetaData "Module" "HsInspect.LSP.HsInspect" "hsinspect-lsp-0.0.3-3bdJrSliDOAk0YsLeurki" False) (C1 (MetaCons "Module" PrefixI True) (S1 (MetaSel (Just "_module") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: S1 (MetaSel (Just "_ids") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Entry]))))

data Entry Source #

Constructors

Id 
Con 
Pat 
TyCon 
Instances
Eq Entry Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Methods

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

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

Show Entry Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Methods

showsPrec :: Int -> Entry -> ShowS #

show :: Entry -> String #

showList :: [Entry] -> ShowS #

Generic Entry Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Associated Types

type Rep Entry :: Type -> Type #

Methods

from :: Entry -> Rep Entry x #

to :: Rep Entry x -> Entry #

FromJSON Entry Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Entry Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

data Exported Source #

Constructors

Exported 

Fields

Instances
Eq Exported Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Show Exported Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Generic Exported Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

Associated Types

type Rep Exported :: Type -> Type #

Methods

from :: Exported -> Rep Exported x #

to :: Rep Exported x -> Exported #

FromJSON Exported Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Exported Source # 
Instance details

Defined in HsInspect.LSP.HsInspect

type Rep Exported = D1 (MetaData "Exported" "HsInspect.LSP.HsInspect" "hsinspect-lsp-0.0.3-3bdJrSliDOAk0YsLeurki" False) (C1 (MetaCons "Exported" PrefixI True) (S1 (MetaSel (Just "_srcid") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_module") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))