Safe Haskell | None |
---|---|
Language | GHC2021 |
Ide.Plugin.SemanticTokens.Types
Synopsis
- data HsSemanticTokenType
- data SemanticTokensConfig = STC {
- stFunction :: !SemanticTokenTypes
- stVariable :: !SemanticTokenTypes
- stDataConstructor :: !SemanticTokenTypes
- stTypeVariable :: !SemanticTokenTypes
- stClassMethod :: !SemanticTokenTypes
- stPatternSynonym :: !SemanticTokenTypes
- stTypeConstructor :: !SemanticTokenTypes
- stClass :: !SemanticTokenTypes
- stTypeSynonym :: !SemanticTokenTypes
- stTypeFamily :: !SemanticTokenTypes
- stRecordField :: !SemanticTokenTypes
- stModule :: !SemanticTokenTypes
- stOperator :: !SemanticTokenTypes
- data SemanticTokenOriginal tokenType = SemanticTokenOriginal {
- _tokenType :: tokenType
- _loc :: Loc
- _name :: String
- data Loc = Loc {
- _line :: UInt
- _startChar :: UInt
- _len :: UInt
- data GetSemanticTokens = GetSemanticTokens
- type RangeSemanticTokenTypeList = [(Range, HsSemanticTokenType)]
- newtype RangeHsSemanticTokenTypes = RangeHsSemanticTokenTypes {}
- showRangeToken :: (Range, HsSemanticTokenType) -> String
- showRange :: Range -> String
- data HieFunMaskKind kind where
- data SemanticLog
- type SemanticTokenId = Text
Documentation
data HsSemanticTokenType Source #
Constructors
TVariable | |
TFunction | |
TDataConstructor | |
TTypeVariable | |
TClassMethod | |
TPatternSynonym | |
TTypeConstructor | |
TClass | |
TTypeSynonym | |
TTypeFamily | |
TRecordField | |
TOperator | |
TModule |
Instances
data SemanticTokensConfig Source #
SemanticTokensConfig_ is a configuration for the semantic tokens plugin. it contains map between the hs semantic token type and default token type.
Constructors
STC | |
Fields
|
Instances
Generic SemanticTokensConfig Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types Associated Types
Methods from :: SemanticTokensConfig -> Rep SemanticTokensConfig x # to :: Rep SemanticTokensConfig x -> SemanticTokensConfig # | |||||
Show SemanticTokensConfig Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types Methods showsPrec :: Int -> SemanticTokensConfig -> ShowS # show :: SemanticTokensConfig -> String # showList :: [SemanticTokensConfig] -> ShowS # | |||||
Default SemanticTokensConfig Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types Methods | |||||
type Rep SemanticTokensConfig Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types type Rep SemanticTokensConfig = D1 ('MetaData "SemanticTokensConfig" "Ide.Plugin.SemanticTokens.Types" "haskell-language-server-2.11.0.0-2UZr7U10ZET6GWPaTrLB3D-hls-semantic-tokens-plugin" 'False) (C1 ('MetaCons "STC" 'PrefixI 'True) (((S1 ('MetaSel ('Just "stFunction") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: (S1 ('MetaSel ('Just "stVariable") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: S1 ('MetaSel ('Just "stDataConstructor") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes))) :*: (S1 ('MetaSel ('Just "stTypeVariable") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: (S1 ('MetaSel ('Just "stClassMethod") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: S1 ('MetaSel ('Just "stPatternSynonym") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes)))) :*: ((S1 ('MetaSel ('Just "stTypeConstructor") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: (S1 ('MetaSel ('Just "stClass") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: S1 ('MetaSel ('Just "stTypeSynonym") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes))) :*: ((S1 ('MetaSel ('Just "stTypeFamily") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: S1 ('MetaSel ('Just "stRecordField") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes)) :*: (S1 ('MetaSel ('Just "stModule") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes) :*: S1 ('MetaSel ('Just "stOperator") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SemanticTokenTypes)))))) |
data SemanticTokenOriginal tokenType Source #
Constructors
SemanticTokenOriginal | |
Fields
|
Instances
Show tokenType => Show (SemanticTokenOriginal tokenType) Source # | |
Defined in Ide.Plugin.SemanticTokens.Types Methods showsPrec :: Int -> SemanticTokenOriginal tokenType -> ShowS # show :: SemanticTokenOriginal tokenType -> String # showList :: [SemanticTokenOriginal tokenType] -> ShowS # | |
Eq tokenType => Eq (SemanticTokenOriginal tokenType) Source # | |
Defined in Ide.Plugin.SemanticTokens.Types Methods (==) :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> Bool # (/=) :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> Bool # | |
Ord tokenType => Ord (SemanticTokenOriginal tokenType) Source # | |
Defined in Ide.Plugin.SemanticTokens.Types Methods compare :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> Ordering # (<) :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> Bool # (<=) :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> Bool # (>) :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> Bool # (>=) :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> Bool # max :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType # min :: SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType -> SemanticTokenOriginal tokenType # |
Constructors
Loc | |
Fields
|
data GetSemanticTokens Source #
Constructors
GetSemanticTokens |
Instances
Generic GetSemanticTokens Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types Associated Types
Methods from :: GetSemanticTokens -> Rep GetSemanticTokens x # to :: Rep GetSemanticTokens x -> GetSemanticTokens # | |||||
Show GetSemanticTokens Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types Methods showsPrec :: Int -> GetSemanticTokens -> ShowS # show :: GetSemanticTokens -> String # showList :: [GetSemanticTokens] -> ShowS # | |||||
NFData GetSemanticTokens Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types Methods rnf :: GetSemanticTokens -> () # | |||||
Eq GetSemanticTokens Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types Methods (==) :: GetSemanticTokens -> GetSemanticTokens -> Bool # (/=) :: GetSemanticTokens -> GetSemanticTokens -> Bool # | |||||
Hashable GetSemanticTokens Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types | |||||
type Rep GetSemanticTokens Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types | |||||
type RuleResult GetSemanticTokens Source # | |||||
Defined in Ide.Plugin.SemanticTokens.Types |
type RangeSemanticTokenTypeList = [(Range, HsSemanticTokenType)] Source #
newtype RangeHsSemanticTokenTypes Source #
Constructors
RangeHsSemanticTokenTypes | |
Instances
Show RangeHsSemanticTokenTypes Source # | |
Defined in Ide.Plugin.SemanticTokens.Types Methods showsPrec :: Int -> RangeHsSemanticTokenTypes -> ShowS # show :: RangeHsSemanticTokenTypes -> String # showList :: [RangeHsSemanticTokenTypes] -> ShowS # | |
NFData RangeHsSemanticTokenTypes Source # | |
Defined in Ide.Plugin.SemanticTokens.Types Methods rnf :: RangeHsSemanticTokenTypes -> () # |
showRangeToken :: (Range, HsSemanticTokenType) -> String Source #
data HieFunMaskKind kind where Source #
Constructors
HieFreshFun :: HieFunMaskKind Type | |
HieFromDiskFun :: Array TypeIndex Bool -> HieFunMaskKind Int |
data SemanticLog Source #
Constructors
LogShake Log | |
LogDependencyError PluginError | |
LogNoAST FilePath | |
LogConfig SemanticTokensConfig | |
LogMsg String | |
LogNoVF | |
LogSemanticTokensDeltaMisMatch Text (Maybe Text) |
Instances
Pretty SemanticLog Source # | |
Defined in Ide.Plugin.SemanticTokens.Types |
type SemanticTokenId = Text Source #