| Safe Haskell | None |
|---|---|
| Language | Haskell98 |
ShellCheck.Interface
Documentation
data SystemInterface (m :: Type -> Type) Source #
Constructors
| SystemInterface | |
Fields
| |
data CheckResult Source #
Instances
| Show CheckResult Source # | |
Defined in ShellCheck.Interface Methods showsPrec :: Int -> CheckResult -> ShowS # show :: CheckResult -> String # showList :: [CheckResult] -> ShowS # | |
| Eq CheckResult Source # | |
Defined in ShellCheck.Interface | |
data ParseResult Source #
Instances
| Show ParseResult Source # | |
Defined in ShellCheck.Interface Methods showsPrec :: Int -> ParseResult -> ShowS # show :: ParseResult -> String # showList :: [ParseResult] -> ShowS # | |
| Eq ParseResult Source # | |
Defined in ShellCheck.Interface | |
data AnalysisSpec Source #
data AnalysisResult Source #
data FormatterOptions Source #
data ExecutionMode Source #
Instances
| Show ExecutionMode Source # | |
Defined in ShellCheck.Interface Methods showsPrec :: Int -> ExecutionMode -> ShowS # show :: ExecutionMode -> String # showList :: [ExecutionMode] -> ShowS # | |
| Eq ExecutionMode Source # | |
Defined in ShellCheck.Interface Methods (==) :: ExecutionMode -> ExecutionMode -> Bool # (/=) :: ExecutionMode -> ExecutionMode -> Bool # | |
type ErrorMessage = String Source #
Instances
Instances
| Generic Position Source # | |||||
Defined in ShellCheck.Interface Associated Types
| |||||
| Show Position Source # | |||||
| NFData Position Source # | |||||
Defined in ShellCheck.Interface | |||||
| Eq Position Source # | |||||
| Ord Position Source # | |||||
Defined in ShellCheck.Interface | |||||
| type Rep Position Source # | |||||
Defined in ShellCheck.Interface type Rep Position = D1 ('MetaData "Position" "ShellCheck.Interface" "ShellCheck-0.11.0-9dBVBXTyskt5wuui7AynaF" 'False) (C1 ('MetaCons "Position" 'PrefixI 'True) (S1 ('MetaSel ('Just "posFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "posLine") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "posColumn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))) | |||||
Instances
| Generic Comment Source # | |||||
Defined in ShellCheck.Interface Associated Types
| |||||
| Show Comment Source # | |||||
| NFData Comment Source # | |||||
Defined in ShellCheck.Interface | |||||
| Eq Comment Source # | |||||
| type Rep Comment Source # | |||||
Defined in ShellCheck.Interface type Rep Comment = D1 ('MetaData "Comment" "ShellCheck.Interface" "ShellCheck-0.11.0-9dBVBXTyskt5wuui7AynaF" 'False) (C1 ('MetaCons "Comment" 'PrefixI 'True) (S1 ('MetaSel ('Just "cSeverity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Severity) :*: (S1 ('MetaSel ('Just "cCode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Code) :*: S1 ('MetaSel ('Just "cMessage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))) | |||||
data PositionedComment Source #
Instances
| Ranged PositionedComment Source # | |||||
Defined in ShellCheck.Fixer Methods start :: PositionedComment -> Position Source # end :: PositionedComment -> Position Source # overlap :: PositionedComment -> PositionedComment -> Bool Source # setRange :: (Position, Position) -> PositionedComment -> PositionedComment Source # | |||||
| ToJSON PositionedComment Source # | |||||
Defined in ShellCheck.Formatter.JSON1 Methods toJSON :: PositionedComment -> Value # toEncoding :: PositionedComment -> Encoding # toJSONList :: [PositionedComment] -> Value # toEncodingList :: [PositionedComment] -> Encoding # omitField :: PositionedComment -> Bool # | |||||
| ToJSON PositionedComment Source # | |||||
Defined in ShellCheck.Formatter.JSON Methods toJSON :: PositionedComment -> Value # toEncoding :: PositionedComment -> Encoding # toJSONList :: [PositionedComment] -> Value # toEncodingList :: [PositionedComment] -> Encoding # omitField :: PositionedComment -> Bool # | |||||
| Generic PositionedComment Source # | |||||
Defined in ShellCheck.Interface Associated Types
Methods from :: PositionedComment -> Rep PositionedComment x # to :: Rep PositionedComment x -> PositionedComment # | |||||
| Show PositionedComment Source # | |||||
Defined in ShellCheck.Interface Methods showsPrec :: Int -> PositionedComment -> ShowS # show :: PositionedComment -> String # showList :: [PositionedComment] -> ShowS # | |||||
| NFData PositionedComment Source # | |||||
Defined in ShellCheck.Interface Methods rnf :: PositionedComment -> () # | |||||
| Eq PositionedComment Source # | |||||
Defined in ShellCheck.Interface Methods (==) :: PositionedComment -> PositionedComment -> Bool # (/=) :: PositionedComment -> PositionedComment -> Bool # | |||||
| type Rep PositionedComment Source # | |||||
Defined in ShellCheck.Interface type Rep PositionedComment = D1 ('MetaData "PositionedComment" "ShellCheck.Interface" "ShellCheck-0.11.0-9dBVBXTyskt5wuui7AynaF" 'False) (C1 ('MetaCons "PositionedComment" 'PrefixI 'True) ((S1 ('MetaSel ('Just "pcStartPos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Position) :*: S1 ('MetaSel ('Just "pcEndPos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Position)) :*: (S1 ('MetaSel ('Just "pcComment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Comment) :*: S1 ('MetaSel ('Just "pcFix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Fix))))) | |||||
data ColorOption Source #
Constructors
| ColorAuto | |
| ColorAlways | |
| ColorNever |
Instances
| Show ColorOption Source # | |
Defined in ShellCheck.Interface Methods showsPrec :: Int -> ColorOption -> ShowS # show :: ColorOption -> String # showList :: [ColorOption] -> ShowS # | |
| Eq ColorOption Source # | |
Defined in ShellCheck.Interface | |
| Ord ColorOption Source # | |
Defined in ShellCheck.Interface Methods compare :: ColorOption -> ColorOption -> Ordering # (<) :: ColorOption -> ColorOption -> Bool # (<=) :: ColorOption -> ColorOption -> Bool # (>) :: ColorOption -> ColorOption -> Bool # (>=) :: ColorOption -> ColorOption -> Bool # max :: ColorOption -> ColorOption -> ColorOption # min :: ColorOption -> ColorOption -> ColorOption # | |
data TokenComment Source #
Instances
| Generic TokenComment Source # | |||||
Defined in ShellCheck.Interface Associated Types
| |||||
| Show TokenComment Source # | |||||
Defined in ShellCheck.Interface Methods showsPrec :: Int -> TokenComment -> ShowS # show :: TokenComment -> String # showList :: [TokenComment] -> ShowS # | |||||
| NFData TokenComment Source # | |||||
Defined in ShellCheck.Interface Methods rnf :: TokenComment -> () # | |||||
| Eq TokenComment Source # | |||||
Defined in ShellCheck.Interface | |||||
| type Rep TokenComment Source # | |||||
Defined in ShellCheck.Interface type Rep TokenComment = D1 ('MetaData "TokenComment" "ShellCheck.Interface" "ShellCheck-0.11.0-9dBVBXTyskt5wuui7AynaF" 'False) (C1 ('MetaCons "TokenComment" 'PrefixI 'True) (S1 ('MetaSel ('Just "tcId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id) :*: (S1 ('MetaSel ('Just "tcComment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Comment) :*: S1 ('MetaSel ('Just "tcFix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Fix))))) | |||||
newAnalysisSpec :: Token -> AnalysisSpec Source #
newSystemInterface :: forall (m :: Type -> Type). Monad m => SystemInterface m Source #
mockedSystemInterface :: [(String, String)] -> SystemInterface Identity Source #
mockRcFile :: forall {m :: Type -> Type}. Monad m => String -> SystemInterface m -> SystemInterface m Source #
newComment :: Comment Source #
Instances
| ToJSON Fix Source # | |||||
| ToJSON Fix Source # | |||||
| Monoid Fix Source # | |||||
| Semigroup Fix Source # | |||||
| Generic Fix Source # | |||||
Defined in ShellCheck.Interface Associated Types
| |||||
| Show Fix Source # | |||||
| NFData Fix Source # | |||||
Defined in ShellCheck.Interface | |||||
| Eq Fix Source # | |||||
| type Rep Fix Source # | |||||
Defined in ShellCheck.Interface type Rep Fix = D1 ('MetaData "Fix" "ShellCheck.Interface" "ShellCheck-0.11.0-9dBVBXTyskt5wuui7AynaF" 'False) (C1 ('MetaCons "Fix" 'PrefixI 'True) (S1 ('MetaSel ('Just "fixReplacements") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Replacement]))) | |||||
data InsertionPoint Source #
Constructors
| InsertBefore | |
| InsertAfter |
Instances
| Generic InsertionPoint Source # | |||||
Defined in ShellCheck.Interface Associated Types
Methods from :: InsertionPoint -> Rep InsertionPoint x # to :: Rep InsertionPoint x -> InsertionPoint # | |||||
| Show InsertionPoint Source # | |||||
Defined in ShellCheck.Interface Methods showsPrec :: Int -> InsertionPoint -> ShowS # show :: InsertionPoint -> String # showList :: [InsertionPoint] -> ShowS # | |||||
| NFData InsertionPoint Source # | |||||
Defined in ShellCheck.Interface Methods rnf :: InsertionPoint -> () # | |||||
| Eq InsertionPoint Source # | |||||
Defined in ShellCheck.Interface Methods (==) :: InsertionPoint -> InsertionPoint -> Bool # (/=) :: InsertionPoint -> InsertionPoint -> Bool # | |||||
| type Rep InsertionPoint Source # | |||||
Defined in ShellCheck.Interface | |||||
data Replacement Source #
Instances
| Ranged Replacement Source # | |||||
Defined in ShellCheck.Fixer Methods start :: Replacement -> Position Source # end :: Replacement -> Position Source # overlap :: Replacement -> Replacement -> Bool Source # setRange :: (Position, Position) -> Replacement -> Replacement Source # | |||||
| ToJSON Replacement Source # | |||||
Defined in ShellCheck.Formatter.JSON1 Methods toJSON :: Replacement -> Value # toEncoding :: Replacement -> Encoding # toJSONList :: [Replacement] -> Value # toEncodingList :: [Replacement] -> Encoding # omitField :: Replacement -> Bool # | |||||
| ToJSON Replacement Source # | |||||
Defined in ShellCheck.Formatter.JSON Methods toJSON :: Replacement -> Value # toEncoding :: Replacement -> Encoding # toJSONList :: [Replacement] -> Value # toEncodingList :: [Replacement] -> Encoding # omitField :: Replacement -> Bool # | |||||
| Generic Replacement Source # | |||||
Defined in ShellCheck.Interface Associated Types
| |||||
| Show Replacement Source # | |||||
Defined in ShellCheck.Interface Methods showsPrec :: Int -> Replacement -> ShowS # show :: Replacement -> String # showList :: [Replacement] -> ShowS # | |||||
| NFData Replacement Source # | |||||
Defined in ShellCheck.Interface Methods rnf :: Replacement -> () # | |||||
| Eq Replacement Source # | |||||
Defined in ShellCheck.Interface | |||||
| type Rep Replacement Source # | |||||
Defined in ShellCheck.Interface type Rep Replacement = D1 ('MetaData "Replacement" "ShellCheck.Interface" "ShellCheck-0.11.0-9dBVBXTyskt5wuui7AynaF" 'False) (C1 ('MetaCons "Replacement" 'PrefixI 'True) ((S1 ('MetaSel ('Just "repStartPos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Position) :*: S1 ('MetaSel ('Just "repEndPos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Position)) :*: (S1 ('MetaSel ('Just "repString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "repPrecedence") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "repInsertionPoint") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InsertionPoint))))) | |||||
data CheckDescription Source #