Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- 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 {
- sections :: [Section]
- module_ :: !TextDocumentIdentifier
- evalId :: !EvalId
Documentation
Instances
isProperty :: Test -> Bool Source #
SingleLine | |
MultiLine Range |
|
Instances
Eq Format Source # | |
Ord Format Source # | |
Show Format Source # | |
Generic Format Source # | |
ToJSON Format Source # | |
Defined in Ide.Plugin.Eval.Types | |
FromJSON Format Source # | |
NFData Format Source # | |
Defined in Ide.Plugin.Eval.Types | |
type Rep Format Source # | |
Defined in Ide.Plugin.Eval.Types type Rep Format = D1 ('MetaData "Format" "Ide.Plugin.Eval.Types" "hls-eval-plugin-1.1.0.0-43E0Dbls0ww9Dxeum0NBZ7" '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
Section | |
|
Instances
Eq Section Source # | |
Show Section Source # | |
Generic Section Source # | |
ToJSON Section Source # | |
Defined in Ide.Plugin.Eval.Types | |
FromJSON Section Source # | |
NFData Section Source # | |
Defined in Ide.Plugin.Eval.Types | |
type Rep Section Source # | |
Defined in Ide.Plugin.Eval.Types type Rep Section = D1 ('MetaData "Section" "Ide.Plugin.Eval.Types" "hls-eval-plugin-1.1.0.0-43E0Dbls0ww9Dxeum0NBZ7" '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)))) |
Sections | |
|
Instances
Eq Sections Source # | |
Show Sections Source # | |
Generic Sections Source # | |
type Rep Sections Source # | |
Defined in Ide.Plugin.Eval.Types type Rep Sections = D1 ('MetaData "Sections" "Ide.Plugin.Eval.Types" "hls-eval-plugin-1.1.0.0-43E0Dbls0ww9Dxeum0NBZ7" '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 # | |
(Eq l, Eq a) => Eq (Located l a) Source # | |
(Ord l, Ord a) => Ord (Located l a) Source # | |
Defined in Ide.Plugin.Eval.Types | |
(Show l, Show a) => Show (Located l a) Source # | |
Generic (Located l a) Source # | |
(ToJSON a, ToJSON l) => ToJSON (Located l a) Source # | |
Defined in Ide.Plugin.Eval.Types | |
(FromJSON l, FromJSON a) => FromJSON (Located l a) Source # | |
(NFData l, NFData a) => NFData (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" "hls-eval-plugin-1.1.0.0-43E0Dbls0ww9Dxeum0NBZ7" 'False) (C1 ('MetaCons "Located" 'PrefixI 'True) (S1 ('MetaSel ('Just "location") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 l) :*: S1 ('MetaSel ('Just "located") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) |
Instances
Eq Comments Source # | |
Ord Comments Source # | |
Defined in Ide.Plugin.Eval.Types | |
Show Comments Source # | |
Generic Comments Source # | |
Semigroup Comments Source # | |
Monoid Comments Source # | |
type Rep Comments Source # | |
Defined in Ide.Plugin.Eval.Types type Rep Comments = D1 ('MetaData "Comments" "Ide.Plugin.Eval.Types" "hls-eval-plugin-1.1.0.0-43E0Dbls0ww9Dxeum0NBZ7" '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 #
Instances
newtype RawLineComment Source #
Instances
data EvalParams Source #
Specify the test section to execute
EvalParams | |
|
Instances
Eq EvalParams Source # | |
Defined in Ide.Plugin.Eval.Types (==) :: EvalParams -> EvalParams -> Bool # (/=) :: EvalParams -> EvalParams -> Bool # | |
Show EvalParams Source # | |
Defined in Ide.Plugin.Eval.Types showsPrec :: Int -> EvalParams -> ShowS # show :: EvalParams -> String # showList :: [EvalParams] -> ShowS # | |
Generic EvalParams Source # | |
Defined in Ide.Plugin.Eval.Types type Rep EvalParams :: Type -> Type # from :: EvalParams -> Rep EvalParams x # to :: Rep EvalParams x -> EvalParams # | |
ToJSON EvalParams Source # | |
Defined in Ide.Plugin.Eval.Types toJSON :: EvalParams -> Value # toEncoding :: EvalParams -> Encoding # toJSONList :: [EvalParams] -> Value # toEncodingList :: [EvalParams] -> Encoding # | |
FromJSON EvalParams Source # | |
Defined in Ide.Plugin.Eval.Types parseJSON :: Value -> Parser EvalParams # parseJSONList :: Value -> Parser [EvalParams] # | |
type Rep EvalParams Source # | |
Defined in Ide.Plugin.Eval.Types |