hls-test-utils-2.9.0.0: Utilities used in the tests of Haskell Language Server
Safe HaskellSafe-Inferred
LanguageGHC2021

Test.Hls

Synopsis

Documentation

data TestTree #

The main data structure defining a test suite.

It consists of individual test cases and properties, organized in named groups which form a tree-like hierarchy.

There is no generic way to create a test case. Instead, every test provider (tasty-hunit, tasty-smallcheck etc.) provides a function to turn a test case into a TestTree.

Groups can be created using testGroup.

Since: tasty-0.1

data DependencyType #

These are the two ways in which one test may depend on the others.

This is the same distinction as the hard vs soft dependencies in TestNG.

Since: tasty-1.2

Constructors

AllSucceed

The current test tree will be executed after its dependencies finish, and only if all of the dependencies succeed.

AllFinish

The current test tree will be executed after its dependencies finish, regardless of whether they succeed or not.

type TestName = String #

The name of a test or a group of tests.

Since: tasty-0.1

pattern NoTimeout :: Timeout #

defaultMain :: TestTree -> IO () #

Parse the command line arguments and run the tests.

When the tests finish, this function calls exitWith with the exit code that indicates whether any tests have failed. Most external systems (stack, cabal, travis-ci, jenkins etc.) rely on the exit code to detect whether the tests pass. If you want to do something else after defaultMain returns, you need to catch the exception and then re-throw it. Example:

import Test.Tasty
import Test.Tasty.HUnit
import System.Exit
import Control.Exception

test = testCase "Test 1" (2 @?= 3)

main = defaultMain test
  `catch` (\e -> do
    if e == ExitSuccess
      then putStrLn "Yea"
      else putStrLn "Nay"
    throwIO e)

Since: tasty-0.1

after #

Arguments

:: DependencyType

whether to run the tests even if some of the dependencies fail

-> String

the pattern

-> TestTree

the subtree that depends on other tests

-> TestTree

the subtree annotated with dependency information

The after combinator declares dependencies between tests.

If a TestTree is wrapped in after, the tests in this tree will not run until certain other tests («dependencies») have finished. These dependencies are specified using an AWK pattern (see the «Patterns» section in the README).

Moreover, if the DependencyType argument is set to AllSucceed and at least one dependency has failed, this test tree will not run at all.

Tasty does not check that the pattern matches any tests (let alone the correct set of tests), so it is on you to supply the right pattern.

Examples

Expand

The following test will be executed only after all tests that contain Foo anywhere in their path finish.

after AllFinish "Foo" $
   

testCase "A test that depends on Foo.Bar" $ ...

Note, however, that our test also happens to contain Foo as part of its name, so it also matches the pattern and becomes a dependency of itself. This will result in a DependencyLoop exception. To avoid this, either change the test name so that it doesn't mention Foo or make the pattern more specific.

You can use AWK patterns, for instance, to specify the full path to the dependency.

after AllFinish "$0 == \"Tests.Foo.Bar\"" $
   

testCase "A test that depends on Foo.Bar" $ ...

Or only specify the dependency's own name, ignoring the group names:

after AllFinish "$NF == \"Bar\"" $
   

testCase "A test that depends on Foo.Bar" $ ...

Since: tasty-1.2

askOption :: IsOption v => (v -> TestTree) -> TestTree #

Customize the test tree based on the run-time options.

Since: tasty-0.6

localOption :: IsOption v => v -> TestTree -> TestTree #

Locally set the option value for the given test subtree.

Since: tasty-0.1

defaultIngredients :: [Ingredient] #

List of the default ingredients. This is what defaultMain uses.

At the moment it consists of listingTests and consoleTestReporter.

Since: tasty-0.4.2

mkTimeout #

Arguments

:: Integer

microseconds

-> Timeout 

A shortcut for creating Timeout values.

Since: tasty-0.8

testGroup :: TestName -> [TestTree] -> TestTree #

Create a named group of test cases or other groups. Tests are executed in parallel. For sequential execution, see sequentialTestGroup.

Since: tasty-0.1

sequentialTestGroup :: TestName -> DependencyType -> [TestTree] -> TestTree #

Create a named group of test cases or other groups. Tests are executed in order. For parallel execution, see testGroup.

after_ #

Arguments

:: DependencyType

whether to run the tests even if some of the dependencies fail

-> Expr

the pattern

-> TestTree

the subtree that depends on other tests

-> TestTree

the subtree annotated with dependency information

Like after, but accepts the pattern as a syntax tree instead of a string. Useful for generating a test tree programmatically.

Examples

Expand

Only match on the test's own name, ignoring the group names:

after_ AllFinish (EQ (Field NF) (StringLit "Bar")) $
   

testCase "A test that depends on Foo.Bar" $ ...

Since: tasty-1.2

includingOptions :: [OptionDescription] -> Ingredient #

This ingredient doesn't do anything apart from registering additional options.

The option values can be accessed using askOption.

Since: tasty-0.6

defaultMainWithIngredients :: [Ingredient] -> TestTree -> IO () #

Parse the command line arguments and run the tests using the provided ingredient list.

When the tests finish, this function calls exitWith with the exit code that indicates whether any tests have failed. See defaultMain for details.

Since: tasty-0.4

adjustOption :: IsOption v => (v -> v) -> TestTree -> TestTree #

Locally adjust the option value for the given test subtree.

Since: tasty-0.1

withResource #

Arguments

:: IO a

initialize the resource

-> (a -> IO ())

free the resource

-> (IO a -> TestTree)

IO a is an action which returns the acquired resource. Despite it being an IO action, the resource it returns will be acquired only once and shared across all the tests in the tree.

-> TestTree 

Acquire the resource to run this test (sub)tree and release it afterwards.

Since: tasty-0.5

newtype Pattern #

Constructors

Pattern Text 

Instances

Instances details
FromJSON Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

FromJSONKey Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

ToJSON Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

ToJSONKey Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

Generic Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

Associated Types

type Rep Pattern :: Type -> Type #

Methods

from :: Pattern -> Rep Pattern x #

to :: Rep Pattern x -> Pattern #

Show Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

NFData Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

Methods

rnf :: Pattern -> () #

Eq Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

Methods

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

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

Ord Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

Hashable Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

Methods

hashWithSalt :: Int -> Pattern -> Int #

hash :: Pattern -> Int #

Pretty Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

Methods

pretty :: Pattern -> Doc ann #

prettyList :: [Pattern] -> Doc ann #

HasPattern RelativePattern Pattern 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep Pattern 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Pattern

type Rep Pattern = D1 ('MetaData "Pattern" "Language.LSP.Protocol.Internal.Types.Pattern" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'True) (C1 ('MetaCons "Pattern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data UInt #

Instances

Instances details
FromJSON UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

ToJSON UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Bounded UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Enum UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

succ :: UInt -> UInt #

pred :: UInt -> UInt #

toEnum :: Int -> UInt #

fromEnum :: UInt -> Int #

enumFrom :: UInt -> [UInt] #

enumFromThen :: UInt -> UInt -> [UInt] #

enumFromTo :: UInt -> UInt -> [UInt] #

enumFromThenTo :: UInt -> UInt -> UInt -> [UInt] #

Generic UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Associated Types

type Rep UInt :: Type -> Type #

Methods

from :: UInt -> Rep UInt x #

to :: Rep UInt x -> UInt #

Num UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

(+) :: UInt -> UInt -> UInt #

(-) :: UInt -> UInt -> UInt #

(*) :: UInt -> UInt -> UInt #

negate :: UInt -> UInt #

abs :: UInt -> UInt #

signum :: UInt -> UInt #

fromInteger :: Integer -> UInt #

Read UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Integral UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

quot :: UInt -> UInt -> UInt #

rem :: UInt -> UInt -> UInt #

div :: UInt -> UInt -> UInt #

mod :: UInt -> UInt -> UInt #

quotRem :: UInt -> UInt -> (UInt, UInt) #

divMod :: UInt -> UInt -> (UInt, UInt) #

toInteger :: UInt -> Integer #

Real UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

toRational :: UInt -> Rational #

Show UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

showsPrec :: Int -> UInt -> ShowS #

show :: UInt -> String #

showList :: [UInt] -> ShowS #

NFData UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

rnf :: UInt -> () #

Eq UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

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

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

Ord UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

compare :: UInt -> UInt -> Ordering #

(<) :: UInt -> UInt -> Bool #

(<=) :: UInt -> UInt -> Bool #

(>) :: UInt -> UInt -> Bool #

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

max :: UInt -> UInt -> UInt #

min :: UInt -> UInt -> UInt #

Hashable UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

hashWithSalt :: Int -> UInt -> Int #

hash :: UInt -> Int #

Pretty UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

Methods

pretty :: UInt -> Doc ann #

prettyList :: [UInt] -> Doc ann #

HasCharacter CodePointPosition UInt 
Instance details

Defined in Language.LSP.VFS

HasLine CodePointPosition UInt 
Instance details

Defined in Language.LSP.VFS

HasCharacter Position UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDeleteCount NotebookCellArrayChange UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDeleteCount SemanticTokensEdit UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDeltaLine SemanticTokenRelative UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDeltaStartChar SemanticTokenRelative UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasEndLine FoldingRange UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasExecutionOrder ExecutionSummary UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLength SemanticTokenAbsolute UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLength SemanticTokenRelative UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLine Position UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLine SemanticTokenAbsolute UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStart NotebookCellArrayChange UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStart SemanticTokensEdit UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStartChar SemanticTokenAbsolute UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStartLine FoldingRange UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasTabSize FormattingOptions UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasActiveParameter SignatureHelp (Maybe (UInt |? Null)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasActiveParameter SignatureInformation (Maybe (UInt |? Null)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasActiveSignature SignatureHelp (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasData_ SemanticTokens [UInt] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasData_ SemanticTokensEdit (Maybe [UInt]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasData_ SemanticTokensPartialResult [UInt] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasEndCharacter FoldingRange (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasFailedChange ApplyWorkspaceEditResult (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPercentage WorkDoneProgressBegin (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPercentage WorkDoneProgressReport (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRangeLength TextDocumentContentChangePartial (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRangeLimit FoldingRangeClientCapabilities (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStartCharacter FoldingRange (Maybe UInt) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLabel ParameterInformation (Text |? (UInt, UInt)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Common

type Rep UInt = D1 ('MetaData "UInt" "Language.LSP.Protocol.Types.Common" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'True) (C1 ('MetaCons "UInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Mod (2 ^ 31)))))

data Int32 #

32-bit signed integer type

Instances

Instances details
FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Bits Int32

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int32

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Ix Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Show Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

Outputable Int32 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int32 -> SDoc #

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Ord Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int32 -> Int32 -> Ordering #

(<) :: Int32 -> Int32 -> Bool #

(<=) :: Int32 -> Int32 -> Bool #

(>) :: Int32 -> Int32 -> Bool #

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

max :: Int32 -> Int32 -> Int32 #

min :: Int32 -> Int32 -> Int32 #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann #

prettyList :: [Int32] -> Doc ann #

Uniform Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int32 #

UniformRange Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int32, Int32) -> g -> m Int32 #

Ring Int32 
Instance details

Defined in Data.Semiring

Methods

negate :: Int32 -> Int32 #

Semiring Int32 
Instance details

Defined in Data.Semiring

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

HasLsp_version VirtualFile Int32 
Instance details

Defined in Language.LSP.VFS

HasFrameId InlineValueContext Int32 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion NotebookDocument Int32 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion TextDocumentItem Int32 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion VersionedNotebookDocumentIdentifier Int32 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion VersionedTextDocumentIdentifier Int32 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

Lift Int32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int32 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int32 -> Code m Int32 #

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

HasCode Diagnostic (Maybe (Int32 |? Text)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion PublishDiagnosticsParams (Maybe Int32) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasId CancelParams (Int32 |? Text) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasProcessId InitializeParams (Int32 |? Null) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasProcessId UInitializeParams (Int32 |? Null) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion OptionalVersionedTextDocumentIdentifier (Int32 |? Null) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion WorkspaceFullDocumentDiagnosticReport (Int32 |? Null) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasVersion WorkspaceUnchangedDocumentDiagnosticReport (Int32 |? Null) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Color #

Constructors

Color 

Fields

Instances

Instances details
FromJSON Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

ToJSON Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Generic Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Associated Types

type Rep Color :: Type -> Type #

Methods

from :: Color -> Rep Color x #

to :: Rep Color x -> Color #

Show Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

NFData Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Methods

rnf :: Color -> () #

Eq Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Methods

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

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

Ord Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

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

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Hashable Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Methods

hashWithSalt :: Int -> Color -> Int #

hash :: Color -> Int #

Pretty Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

Methods

pretty :: Color -> Doc ann #

prettyList :: [Color] -> Doc ann #

HasAlpha Color Float 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasBlue Color Float 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

Methods

blue :: Lens' Color Float

HasColor ColorInformation Color 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasColor ColorPresentationParams Color 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasGreen Color Float 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRed Color Float 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

Methods

red :: Lens' Color Float

type Rep Color 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Color

type Rep Color = D1 ('MetaData "Color" "Language.LSP.Protocol.Internal.Types.Color" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "Color" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_red") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Float) :*: S1 ('MetaSel ('Just "_green") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Float)) :*: (S1 ('MetaSel ('Just "_blue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Float) :*: S1 ('MetaSel ('Just "_alpha") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Float))))

data Location #

Constructors

Location 

Fields

Instances

Instances details
FromJSON Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

ToJSON Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

Generic Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

Associated Types

type Rep Location :: Type -> Type #

Methods

from :: Location -> Rep Location x #

to :: Rep Location x -> Location #

Show Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

NFData Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

Methods

rnf :: Location -> () #

Eq Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

Ord Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

Hashable Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

Methods

hashWithSalt :: Int -> Location -> Int #

hash :: Location -> Int #

Pretty Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

Methods

pretty :: Location -> Doc ann #

prettyList :: [Location] -> Doc ann #

HasLocation DiagnosticRelatedInformation Location 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLocation SymbolInformation Location 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange Location Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri Location Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

Methods

uri :: Lens' Location Uri

HasLocation InlayHintLabelPart (Maybe Location) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLocation WorkspaceSymbol (Location |? LocationUriOnly) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep Location 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Location

type Rep Location = D1 ('MetaData "Location" "Language.LSP.Protocol.Internal.Types.Location" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "Location" 'PrefixI 'True) (S1 ('MetaSel ('Just "_uri") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Uri) :*: S1 ('MetaSel ('Just "_range") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Range)))

data Position #

Constructors

Position 

Fields

Instances

Instances details
FromJSON Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

ToJSON Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

Generic Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

Associated Types

type Rep Position :: Type -> Type #

Methods

from :: Position -> Rep Position x #

to :: Rep Position x -> Position #

Show Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

NFData Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

Methods

rnf :: Position -> () #

Eq Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

Ord Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

Hashable Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

Methods

hashWithSalt :: Int -> Position -> Int #

hash :: Position -> Int #

Pretty Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

Methods

pretty :: Position -> Doc ann #

prettyList :: [Position] -> Doc ann #

HasCharacter Position UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasEnd Range Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasLine Position UInt 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition CallHierarchyPrepareParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition CompletionParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition DeclarationParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition DefinitionParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition DocumentHighlightParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition DocumentOnTypeFormattingParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition HoverParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition ImplementationParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition InlayHint Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition LinkedEditingRangeParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition MonikerParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition PrepareRenameParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition ReferenceParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition RenameParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition SignatureHelpParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition TextDocumentPositionParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition TypeDefinitionParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPosition TypeHierarchyPrepareParams Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStart Range Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasPositions SelectionRangeParams [Position] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep Position 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Position

type Rep Position = D1 ('MetaData "Position" "Language.LSP.Protocol.Internal.Types.Position" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "Position" 'PrefixI 'True) (S1 ('MetaSel ('Just "_line") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 UInt) :*: S1 ('MetaSel ('Just "_character") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 UInt)))

data Diagnostic #

Instances

Instances details
FromJSON Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

ToJSON Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

Generic Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

Associated Types

type Rep Diagnostic :: Type -> Type #

Show Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

NFData Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

Methods

rnf :: Diagnostic -> () #

Eq Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

Ord Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

Hashable Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

Pretty Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

Methods

pretty :: Diagnostic -> Doc ann #

prettyList :: [Diagnostic] -> Doc ann #

HasMessage Diagnostic Text 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange Diagnostic Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasCode Diagnostic (Maybe (Int32 |? Text)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasCodeDescription Diagnostic (Maybe CodeDescription) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasData_ Diagnostic (Maybe Value) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDiagnostics CodeAction (Maybe [Diagnostic]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDiagnostics CodeActionContext [Diagnostic] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDiagnostics PublishDiagnosticsParams [Diagnostic] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasItems FullDocumentDiagnosticReport [Diagnostic] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasItems RelatedFullDocumentDiagnosticReport [Diagnostic] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasItems WorkspaceFullDocumentDiagnosticReport [Diagnostic] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRelatedInformation Diagnostic (Maybe [DiagnosticRelatedInformation]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasSeverity Diagnostic (Maybe DiagnosticSeverity) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasSource Diagnostic (Maybe Text) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasTags Diagnostic (Maybe [DiagnosticTag]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep Diagnostic 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Diagnostic

data Range #

Constructors

Range 

Fields

Instances

Instances details
FromJSON Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

ToJSON Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Generic Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Associated Types

type Rep Range :: Type -> Type #

Methods

from :: Range -> Rep Range x #

to :: Rep Range x -> Range #

Show Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String #

showList :: [Range] -> ShowS #

NFData Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Methods

rnf :: Range -> () #

Eq Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Methods

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

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

Ord Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Methods

compare :: Range -> Range -> Ordering #

(<) :: Range -> Range -> Bool #

(<=) :: Range -> Range -> Bool #

(>) :: Range -> Range -> Bool #

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

max :: Range -> Range -> Range #

min :: Range -> Range -> Range #

Hashable Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Methods

hashWithSalt :: Int -> Range -> Int #

hash :: Range -> Int #

Pretty Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

Methods

pretty :: Range -> Doc ann #

prettyList :: [Range] -> Doc ann #

HasEnd Range Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasInsert EditRangeWithInsertReplace Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasInsert InsertReplaceEdit Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange AnnotatedTextEdit Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange CallHierarchyItem Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange CodeActionParams Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange CodeLens Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange ColorInformation Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange ColorPresentationParams Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange Diagnostic Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange DocumentHighlight Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange DocumentLink Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange DocumentRangeFormattingParams Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange DocumentSymbol Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange InlayHintParams Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange InlineValueEvaluatableExpression Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange InlineValueParams Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange InlineValueText Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange InlineValueVariableLookup Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange Location Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange PrepareRenamePlaceholder Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange SelectionRange Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange SemanticTokensRangeParams Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange TextDocumentContentChangePartial Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange TextEdit Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange TypeHierarchyItem Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasReplace EditRangeWithInsertReplace Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasReplace InsertReplaceEdit Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasSelectionRange CallHierarchyItem Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasSelectionRange DocumentSymbol Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasSelectionRange TypeHierarchyItem Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStart Range Position 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasStoppedLocation InlineValueContext Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasTargetRange LocationLink Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasTargetSelectionRange LocationLink Range 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasEditRange CompletionItemDefaults (Maybe (Range |? EditRangeWithInsertReplace)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasFromRanges CallHierarchyIncomingCall [Range] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasFromRanges CallHierarchyOutgoingCall [Range] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasOriginSelectionRange LocationLink (Maybe Range) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRange Hover (Maybe Range) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRanges LinkedEditingRanges [Range] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasSelection ShowDocumentParams (Maybe Range) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep Range 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Range

type Rep Range = D1 ('MetaData "Range" "Language.LSP.Protocol.Internal.Types.Range" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "Range" 'PrefixI 'True) (S1 ('MetaSel ('Just "_start") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Position) :*: S1 ('MetaSel ('Just "_end") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Position)))

data NormalizedUri #

Constructors

NormalizedUri !Int !Text 

Instances

Instances details
Generic NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Associated Types

type Rep NormalizedUri :: Type -> Type #

Read NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Show NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

NFData NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

rnf :: NormalizedUri -> () #

Eq NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Ord NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Hashable NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Pretty NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

pretty :: NormalizedUri -> Doc ann #

prettyList :: [NormalizedUri] -> Doc ann #

HasVfsMap VFS (Map NormalizedUri VirtualFile) 
Instance details

Defined in Language.LSP.VFS

type Rep NormalizedUri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

type Rep NormalizedUri = D1 ('MetaData "NormalizedUri" "Language.LSP.Protocol.Types.Uri" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "NormalizedUri" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))

data DiagnosticSeverity #

Instances

Instances details
FromJSON DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

ToJSON DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

Generic DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

Associated Types

type Rep DiagnosticSeverity :: Type -> Type #

Show DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

NFData DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

Methods

rnf :: DiagnosticSeverity -> () #

Eq DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

Ord DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

Hashable DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

LspEnum DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

Associated Types

type EnumBaseType DiagnosticSeverity #

Pretty DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

HasSeverity Diagnostic (Maybe DiagnosticSeverity) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

type Rep DiagnosticSeverity = D1 ('MetaData "DiagnosticSeverity" "Language.LSP.Protocol.Internal.Types.DiagnosticSeverity" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) ((C1 ('MetaCons "DiagnosticSeverity_Error" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DiagnosticSeverity_Warning" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DiagnosticSeverity_Information" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DiagnosticSeverity_Hint" 'PrefixI 'False) (U1 :: Type -> Type)))
type EnumBaseType DiagnosticSeverity 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity

data NormalizedFilePath #

Instances

Instances details
IsString NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Generic NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Associated Types

type Rep NormalizedFilePath :: Type -> Type #

Show NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Binary NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

NFData NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

rnf :: NormalizedFilePath -> () #

Eq NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Ord NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Hashable NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

type Rep NormalizedFilePath 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

type Rep NormalizedFilePath = D1 ('MetaData "NormalizedFilePath" "Language.LSP.Protocol.Types.Uri" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "NormalizedFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 NormalizedUri) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Text)))

newtype Uri #

Constructors

Uri 

Fields

Instances

Instances details
FromJSON Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

FromJSONKey Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

ToJSON Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

ToJSONKey Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Generic Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Associated Types

type Rep Uri :: Type -> Type #

Methods

from :: Uri -> Rep Uri x #

to :: Rep Uri x -> Uri #

Read Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Show Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

showsPrec :: Int -> Uri -> ShowS #

show :: Uri -> String #

showList :: [Uri] -> ShowS #

NFData Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

rnf :: Uri -> () #

Eq Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

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

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

Ord Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

compare :: Uri -> Uri -> Ordering #

(<) :: Uri -> Uri -> Bool #

(<=) :: Uri -> Uri -> Bool #

(>) :: Uri -> Uri -> Bool #

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

max :: Uri -> Uri -> Uri #

min :: Uri -> Uri -> Uri #

Hashable Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

hashWithSalt :: Int -> Uri -> Int #

hash :: Uri -> Int #

Pretty Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

Methods

pretty :: Uri -> Doc ann #

prettyList :: [Uri] -> Doc ann #

HasDocument NotebookCell Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasHref CodeDescription Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasNewUri RenameFile Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasOldUri RenameFile Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasTargetUri LocationLink Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri CallHierarchyItem Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri CreateFile Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri DeleteFile Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri FileEvent Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri Location Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

Methods

uri :: Lens' Location Uri

HasUri LocationUriOnly Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri NotebookDocument Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri NotebookDocumentIdentifier Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri OptionalVersionedTextDocumentIdentifier Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri PreviousResultId Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri PublishDiagnosticsParams Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri ShowDocumentParams Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri TextDocumentIdentifier Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri TextDocumentItem Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri TypeHierarchyItem Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri VersionedNotebookDocumentIdentifier Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri VersionedTextDocumentIdentifier Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri WorkspaceFolder Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri WorkspaceFullDocumentDiagnosticReport Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasUri WorkspaceUnchangedDocumentDiagnosticReport Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasChanges WorkspaceEdit (Maybe (Map Uri [TextEdit])) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRelatedDocuments RelatedFullDocumentDiagnosticReport (Maybe (Map Uri (FullDocumentDiagnosticReport |? UnchangedDocumentDiagnosticReport))) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRelatedDocuments RelatedUnchangedDocumentDiagnosticReport (Maybe (Map Uri (FullDocumentDiagnosticReport |? UnchangedDocumentDiagnosticReport))) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasScopeUri ConfigurationItem (Maybe Uri) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasTarget DocumentLink (Maybe Uri) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasBaseUri RelativePattern (WorkspaceFolder |? Uri) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRelatedDocuments DocumentDiagnosticReportPartialResult (Map Uri (FullDocumentDiagnosticReport |? UnchangedDocumentDiagnosticReport)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRootUri InitializeParams (Uri |? Null) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasRootUri UInitializeParams (Uri |? Null) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep Uri 
Instance details

Defined in Language.LSP.Protocol.Types.Uri

type Rep Uri = D1 ('MetaData "Uri" "Language.LSP.Protocol.Types.Uri" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'True) (C1 ('MetaCons "Uri" 'PrefixI 'True) (S1 ('MetaSel ('Just "getUri") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Command #

Constructors

Command 

Instances

Instances details
FromJSON Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

ToJSON Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

Generic Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

Associated Types

type Rep Command :: Type -> Type #

Methods

from :: Command -> Rep Command x #

to :: Rep Command x -> Command #

Show Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

NFData Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

Methods

rnf :: Command -> () #

Eq Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

Methods

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

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

Ord Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

Hashable Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

Methods

hashWithSalt :: Int -> Command -> Int #

hash :: Command -> Int #

Pretty Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

Methods

pretty :: Command -> Doc ann #

prettyList :: [Command] -> Doc ann #

HasCommand Command Text 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasTitle Command Text 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasArguments Command (Maybe [Value]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasCommand CodeAction (Maybe Command) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasCommand CodeLens (Maybe Command) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasCommand CompletionItem (Maybe Command) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasCommand InlayHintLabelPart (Maybe Command) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep Command 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.Command

type Rep Command = D1 ('MetaData "Command" "Language.LSP.Protocol.Internal.Types.Command" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "Command" 'PrefixI 'True) (S1 ('MetaSel ('Just "_title") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "_command") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "_arguments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe [Value])))))

data WorkspaceEdit #

Instances

Instances details
FromJSON WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

ToJSON WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

Generic WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

Associated Types

type Rep WorkspaceEdit :: Type -> Type #

Show WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

NFData WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

Methods

rnf :: WorkspaceEdit -> () #

Eq WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

Ord WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

Hashable WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

Pretty WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

Methods

pretty :: WorkspaceEdit -> Doc ann #

prettyList :: [WorkspaceEdit] -> Doc ann #

HasEdit ApplyWorkspaceEditParams WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasChangeAnnotations WorkspaceEdit (Maybe (Map ChangeAnnotationIdentifier ChangeAnnotation)) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasChanges WorkspaceEdit (Maybe (Map Uri [TextEdit])) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasDocumentChanges WorkspaceEdit (Maybe [TextDocumentEdit |? (CreateFile |? (RenameFile |? DeleteFile))]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasEdit CodeAction (Maybe WorkspaceEdit) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep WorkspaceEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit

type Rep WorkspaceEdit = D1 ('MetaData "WorkspaceEdit" "Language.LSP.Protocol.Internal.Types.WorkspaceEdit" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "WorkspaceEdit" 'PrefixI 'True) (S1 ('MetaSel ('Just "_changes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe (Map Uri [TextEdit]))) :*: (S1 ('MetaSel ('Just "_documentChanges") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe [TextDocumentEdit |? (CreateFile |? (RenameFile |? DeleteFile))])) :*: S1 ('MetaSel ('Just "_changeAnnotations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe (Map ChangeAnnotationIdentifier ChangeAnnotation))))))

data CodeActionKind #

Instances

Instances details
FromJSON CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

ToJSON CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

IsString CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Generic CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Associated Types

type Rep CodeActionKind :: Type -> Type #

Show CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

NFData CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Methods

rnf :: CodeActionKind -> () #

Eq CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Ord CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Hashable CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

LspEnum CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Associated Types

type EnumBaseType CodeActionKind #

LspOpenEnum CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Pretty CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

Methods

pretty :: CodeActionKind -> Doc ann #

prettyList :: [CodeActionKind] -> Doc ann #

HasCodeActionKinds CodeActionOptions (Maybe [CodeActionKind]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasCodeActionKinds CodeActionRegistrationOptions (Maybe [CodeActionKind]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasKind CodeAction (Maybe CodeActionKind) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasOnly CodeActionContext (Maybe [CodeActionKind]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasValueSet ClientCodeActionKindOptions [CodeActionKind] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

type Rep CodeActionKind = D1 ('MetaData "CodeActionKind" "Language.LSP.Protocol.Internal.Types.CodeActionKind" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (((C1 ('MetaCons "CodeActionKind_Empty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CodeActionKind_QuickFix" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CodeActionKind_Refactor" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CodeActionKind_RefactorExtract" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CodeActionKind_RefactorInline" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "CodeActionKind_RefactorRewrite" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CodeActionKind_Source" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CodeActionKind_SourceOrganizeImports" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "CodeActionKind_SourceFixAll" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CodeActionKind_Notebook" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CodeActionKind_Custom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))))))
type EnumBaseType CodeActionKind 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.CodeActionKind

data DiagnosticTag #

Instances

Instances details
FromJSON DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

ToJSON DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

Generic DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

Associated Types

type Rep DiagnosticTag :: Type -> Type #

Show DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

NFData DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

Methods

rnf :: DiagnosticTag -> () #

Eq DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

Ord DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

Hashable DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

LspEnum DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

Associated Types

type EnumBaseType DiagnosticTag #

Pretty DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

Methods

pretty :: DiagnosticTag -> Doc ann #

prettyList :: [DiagnosticTag] -> Doc ann #

HasTags Diagnostic (Maybe [DiagnosticTag]) 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasValueSet ClientDiagnosticsTagOptions [DiagnosticTag] 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

type Rep DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

type Rep DiagnosticTag = D1 ('MetaData "DiagnosticTag" "Language.LSP.Protocol.Internal.Types.DiagnosticTag" "lsp-types-2.3.0.0-6bqFZs2MzRL81rzZYRuAwB" 'False) (C1 ('MetaCons "DiagnosticTag_Unnecessary" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DiagnosticTag_Deprecated" 'PrefixI 'False) (U1 :: Type -> Type))
type EnumBaseType DiagnosticTag 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.DiagnosticTag

data AnnotatedTextEdit #

Instances

Instances details
FromJSON AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

ToJSON AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

Generic AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

Associated Types

type Rep AnnotatedTextEdit :: Type -> Type #

Show AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

NFData AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

Methods

rnf :: AnnotatedTextEdit -> () #

Eq AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

Ord AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

Hashable AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

Pretty AnnotatedTextEdit 
Instance details

Defined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit

HasAnnotationId AnnotatedTextEdit ChangeAnnotationIdentifier 
Instance details

Defined in Language.LSP.Protocol.Types.Lens

HasNewText AnnotatedTextEdit Text 
Instance details

Defined in Language.LSP.Protocol.Types.Lens