| Safe Haskell | None |
|---|---|
| Language | GHC2021 |
Ide.Plugin.Eval.Types
Synopsis
- data Log
- = LogShake Log
- | LogCodeLensFp FilePath
- | LogCodeLensComments Comments
- | LogExecutionTime Text Seconds
- | LogTests !Int !Int !Int !Int
- | LogRunTestResults [Text]
- | LogRunTestEdits TextEdit
- | LogEvalFlags [String]
- | LogEvalPreSetDynFlags DynFlags
- | LogEvalParsedFlags (Either GhcException (DynFlags, [Located String], DynFlagsParsingWarnings))
- | LogEvalPostSetDynFlags DynFlags
- | LogEvalStmtStart String
- | LogEvalStmtResult (Maybe [Text])
- | LogEvalImport String
- | LogEvalDeclaration String
- locate :: Loc [a] -> [Loc a]
- locate0 :: [a] -> [Loc a]
- data Test
- isProperty :: Test -> Bool
- data Format
- data Language
- data Section = Section {
- sectionName :: Txt
- sectionTests :: [Test]
- sectionLanguage :: Language
- sectionFormat :: Format
- data Sections = Sections {
- nonSetupSections :: [Section]
- setupSections :: [Section]
- hasTests :: Section -> Bool
- hasPropertyTest :: Section -> Bool
- splitSections :: [Section] -> ([Section], [Section])
- type Loc = Located Line
- data Located l a = Located {}
- data Comments = Comments {}
- newtype RawBlockComment = RawBlockComment {}
- newtype RawLineComment = RawLineComment {}
- unLoc :: Located l a -> a
- type Txt = String
- data EvalParams = EvalParams {}
- data GetEvalComments = GetEvalComments
- data IsEvaluating = IsEvaluating
- nullComments :: Comments -> Bool
Documentation
Constructors
Instances
isProperty :: Test -> Bool Source #
Constructors
| SingleLine | |
| MultiLine Range |
|
Instances
| FromJSON Format Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| ToJSON Format Source # | |||||
| Generic Format Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| Show Format Source # | |||||
| NFData Format Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| Eq Format Source # | |||||
| Ord Format Source # | |||||
| type Rep Format Source # | |||||
Defined in Ide.Plugin.Eval.Types type Rep Format = D1 ('MetaData "Format" "Ide.Plugin.Eval.Types" "haskell-language-server-2.12.0.0-InCAZasaLKC5qzdZxj895u-hls-eval-plugin" 'False) (C1 ('MetaCons "SingleLine" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MultiLine" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Range))) | |||||
Instances
| FromJSON Language Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| ToJSON Language Source # | |||||
| Generic Language Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| Show Language Source # | |||||
| NFData Language Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| Eq Language Source # | |||||
| Ord Language Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| type Rep Language Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
Constructors
| Section | |
Fields
| |
Instances
| FromJSON Section Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| ToJSON Section Source # | |||||
| Generic Section Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| Show Section Source # | |||||
| NFData Section Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| Eq Section Source # | |||||
| type Rep Section Source # | |||||
Defined in Ide.Plugin.Eval.Types type Rep Section = D1 ('MetaData "Section" "Ide.Plugin.Eval.Types" "haskell-language-server-2.12.0.0-InCAZasaLKC5qzdZxj895u-hls-eval-plugin" 'False) (C1 ('MetaCons "Section" 'PrefixI 'True) ((S1 ('MetaSel ('Just "sectionName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Txt) :*: S1 ('MetaSel ('Just "sectionTests") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Test])) :*: (S1 ('MetaSel ('Just "sectionLanguage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Language) :*: S1 ('MetaSel ('Just "sectionFormat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Format)))) | |||||
Constructors
| Sections | |
Fields
| |
Instances
| Generic Sections Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| Show Sections Source # | |||||
| Eq Sections Source # | |||||
| type Rep Sections Source # | |||||
Defined in Ide.Plugin.Eval.Types type Rep Sections = D1 ('MetaData "Sections" "Ide.Plugin.Eval.Types" "haskell-language-server-2.12.0.0-InCAZasaLKC5qzdZxj895u-hls-eval-plugin" 'False) (C1 ('MetaCons "Sections" 'PrefixI 'True) (S1 ('MetaSel ('Just "nonSetupSections") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Section]) :*: S1 ('MetaSel ('Just "setupSections") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Section]))) | |||||
hasPropertyTest :: Section -> Bool Source #
A thing with a location attached.
Instances
| Functor (Located l) Source # | |||||
| (FromJSON l, FromJSON a) => FromJSON (Located l a) Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| (ToJSON a, ToJSON l) => ToJSON (Located l a) Source # | |||||
| Generic (Located l a) Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| (Show l, Show a) => Show (Located l a) Source # | |||||
| (NFData l, NFData a) => NFData (Located l a) Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| (Eq l, Eq a) => Eq (Located l a) Source # | |||||
| (Ord l, Ord a) => Ord (Located l a) Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| type Rep (Located l a) Source # | |||||
Defined in Ide.Plugin.Eval.Types type Rep (Located l a) = D1 ('MetaData "Located" "Ide.Plugin.Eval.Types" "haskell-language-server-2.12.0.0-InCAZasaLKC5qzdZxj895u-hls-eval-plugin" 'False) (C1 ('MetaCons "Located" 'PrefixI 'True) (S1 ('MetaSel ('Just "location") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 l) :*: S1 ('MetaSel ('Just "located") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) | |||||
Constructors
| Comments | |
Fields | |
Instances
| Monoid Comments Source # | |||||
| Semigroup Comments Source # | |||||
| Generic Comments Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| Show Comments Source # | |||||
| NFData Comments Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| Eq Comments Source # | |||||
| Ord Comments Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| type Rep Comments Source # | |||||
Defined in Ide.Plugin.Eval.Types type Rep Comments = D1 ('MetaData "Comments" "Ide.Plugin.Eval.Types" "haskell-language-server-2.12.0.0-InCAZasaLKC5qzdZxj895u-hls-eval-plugin" 'False) (C1 ('MetaCons "Comments" 'PrefixI 'True) (S1 ('MetaSel ('Just "lineComments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Range RawLineComment)) :*: S1 ('MetaSel ('Just "blockComments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Range RawBlockComment)))) | |||||
newtype RawBlockComment Source #
Constructors
| RawBlockComment | |
Fields | |
Instances
| IsString RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods fromString :: String -> RawBlockComment # | |||||||||
| Monoid RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods mappend :: RawBlockComment -> RawBlockComment -> RawBlockComment # mconcat :: [RawBlockComment] -> RawBlockComment # | |||||||||
| Semigroup RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods (<>) :: RawBlockComment -> RawBlockComment -> RawBlockComment # sconcat :: NonEmpty RawBlockComment -> RawBlockComment # stimes :: Integral b => b -> RawBlockComment -> RawBlockComment # | |||||||||
| Show RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods showsPrec :: Int -> RawBlockComment -> ShowS # show :: RawBlockComment -> String # showList :: [RawBlockComment] -> ShowS # | |||||||||
| NFData RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods rnf :: RawBlockComment -> () # | |||||||||
| Eq RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods (==) :: RawBlockComment -> RawBlockComment -> Bool # (/=) :: RawBlockComment -> RawBlockComment -> Bool # | |||||||||
| Ord RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods compare :: RawBlockComment -> RawBlockComment -> Ordering # (<) :: RawBlockComment -> RawBlockComment -> Bool # (<=) :: RawBlockComment -> RawBlockComment -> Bool # (>) :: RawBlockComment -> RawBlockComment -> Bool # (>=) :: RawBlockComment -> RawBlockComment -> Bool # max :: RawBlockComment -> RawBlockComment -> RawBlockComment # min :: RawBlockComment -> RawBlockComment -> RawBlockComment # | |||||||||
| Stream RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Associated Types
Methods tokenToChunk :: Proxy RawBlockComment -> Token RawBlockComment -> Tokens RawBlockComment # tokensToChunk :: Proxy RawBlockComment -> [Token RawBlockComment] -> Tokens RawBlockComment # chunkToTokens :: Proxy RawBlockComment -> Tokens RawBlockComment -> [Token RawBlockComment] # chunkLength :: Proxy RawBlockComment -> Tokens RawBlockComment -> Int # chunkEmpty :: Proxy RawBlockComment -> Tokens RawBlockComment -> Bool # take1_ :: RawBlockComment -> Maybe (Token RawBlockComment, RawBlockComment) # takeN_ :: Int -> RawBlockComment -> Maybe (Tokens RawBlockComment, RawBlockComment) # takeWhile_ :: (Token RawBlockComment -> Bool) -> RawBlockComment -> (Tokens RawBlockComment, RawBlockComment) # | |||||||||
| TraversableStream RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods reachOffset :: Int -> PosState RawBlockComment -> (Maybe String, PosState RawBlockComment) # reachOffsetNoLine :: Int -> PosState RawBlockComment -> PosState RawBlockComment # | |||||||||
| VisualStream RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods showTokens :: Proxy RawBlockComment -> NonEmpty (Token RawBlockComment) -> String # tokensLength :: Proxy RawBlockComment -> NonEmpty (Token RawBlockComment) -> Int # | |||||||||
| type Token RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types | |||||||||
| type Tokens RawBlockComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types | |||||||||
newtype RawLineComment Source #
Constructors
| RawLineComment | |
Fields | |
Instances
| IsString RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods fromString :: String -> RawLineComment # | |||||||||
| Monoid RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods mappend :: RawLineComment -> RawLineComment -> RawLineComment # mconcat :: [RawLineComment] -> RawLineComment # | |||||||||
| Semigroup RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods (<>) :: RawLineComment -> RawLineComment -> RawLineComment # sconcat :: NonEmpty RawLineComment -> RawLineComment # stimes :: Integral b => b -> RawLineComment -> RawLineComment # | |||||||||
| Show RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods showsPrec :: Int -> RawLineComment -> ShowS # show :: RawLineComment -> String # showList :: [RawLineComment] -> ShowS # | |||||||||
| NFData RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods rnf :: RawLineComment -> () # | |||||||||
| Eq RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods (==) :: RawLineComment -> RawLineComment -> Bool # (/=) :: RawLineComment -> RawLineComment -> Bool # | |||||||||
| Ord RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods compare :: RawLineComment -> RawLineComment -> Ordering # (<) :: RawLineComment -> RawLineComment -> Bool # (<=) :: RawLineComment -> RawLineComment -> Bool # (>) :: RawLineComment -> RawLineComment -> Bool # (>=) :: RawLineComment -> RawLineComment -> Bool # max :: RawLineComment -> RawLineComment -> RawLineComment # min :: RawLineComment -> RawLineComment -> RawLineComment # | |||||||||
| Stream RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Associated Types
Methods tokenToChunk :: Proxy RawLineComment -> Token RawLineComment -> Tokens RawLineComment # tokensToChunk :: Proxy RawLineComment -> [Token RawLineComment] -> Tokens RawLineComment # chunkToTokens :: Proxy RawLineComment -> Tokens RawLineComment -> [Token RawLineComment] # chunkLength :: Proxy RawLineComment -> Tokens RawLineComment -> Int # chunkEmpty :: Proxy RawLineComment -> Tokens RawLineComment -> Bool # take1_ :: RawLineComment -> Maybe (Token RawLineComment, RawLineComment) # takeN_ :: Int -> RawLineComment -> Maybe (Tokens RawLineComment, RawLineComment) # takeWhile_ :: (Token RawLineComment -> Bool) -> RawLineComment -> (Tokens RawLineComment, RawLineComment) # | |||||||||
| TraversableStream RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods reachOffset :: Int -> PosState RawLineComment -> (Maybe String, PosState RawLineComment) # reachOffsetNoLine :: Int -> PosState RawLineComment -> PosState RawLineComment # | |||||||||
| VisualStream RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types Methods showTokens :: Proxy RawLineComment -> NonEmpty (Token RawLineComment) -> String # tokensLength :: Proxy RawLineComment -> NonEmpty (Token RawLineComment) -> Int # | |||||||||
| type Token RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types | |||||||||
| type Tokens RawLineComment Source # | |||||||||
Defined in Ide.Plugin.Eval.Types | |||||||||
data EvalParams Source #
Specify the test section to execute
Constructors
| EvalParams | |
Instances
| FromJSON EvalParams Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| ToJSON EvalParams Source # | |||||
Defined in Ide.Plugin.Eval.Types Methods toJSON :: EvalParams -> Value # toEncoding :: EvalParams -> Encoding # toJSONList :: [EvalParams] -> Value # toEncodingList :: [EvalParams] -> Encoding # omitField :: EvalParams -> Bool # | |||||
| Generic EvalParams Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| Show EvalParams Source # | |||||
Defined in Ide.Plugin.Eval.Types Methods showsPrec :: Int -> EvalParams -> ShowS # show :: EvalParams -> String # showList :: [EvalParams] -> ShowS # | |||||
| Eq EvalParams Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| type Rep EvalParams Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
data GetEvalComments Source #
Constructors
| GetEvalComments |
Instances
| Generic GetEvalComments Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
Methods from :: GetEvalComments -> Rep GetEvalComments x # to :: Rep GetEvalComments x -> GetEvalComments # | |||||
| Show GetEvalComments Source # | |||||
Defined in Ide.Plugin.Eval.Types Methods showsPrec :: Int -> GetEvalComments -> ShowS # show :: GetEvalComments -> String # showList :: [GetEvalComments] -> ShowS # | |||||
| NFData GetEvalComments Source # | |||||
Defined in Ide.Plugin.Eval.Types Methods rnf :: GetEvalComments -> () # | |||||
| Eq GetEvalComments Source # | |||||
Defined in Ide.Plugin.Eval.Types Methods (==) :: GetEvalComments -> GetEvalComments -> Bool # (/=) :: GetEvalComments -> GetEvalComments -> Bool # | |||||
| Hashable GetEvalComments Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| type Rep GetEvalComments Source # | |||||
| type RuleResult GetEvalComments Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
data IsEvaluating Source #
Constructors
| IsEvaluating |
Instances
| Generic IsEvaluating Source # | |||||
Defined in Ide.Plugin.Eval.Types Associated Types
| |||||
| Show IsEvaluating Source # | |||||
Defined in Ide.Plugin.Eval.Types Methods showsPrec :: Int -> IsEvaluating -> ShowS # show :: IsEvaluating -> String # showList :: [IsEvaluating] -> ShowS # | |||||
| NFData IsEvaluating Source # | |||||
Defined in Ide.Plugin.Eval.Types Methods rnf :: IsEvaluating -> () # | |||||
| Eq IsEvaluating Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| Hashable IsEvaluating Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
| type Rep IsEvaluating Source # | |||||
| type RuleResult IsEvaluating Source # | |||||
Defined in Ide.Plugin.Eval.Types | |||||
nullComments :: Comments -> Bool Source #