ShellCheck-0.9.0: Shell script analysis tool
Safe HaskellSafe-Inferred
LanguageHaskell98

ShellCheck.CFG

Documentation

data CFNode Source #

Instances

Instances details
Generic CFNode Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep CFNode :: Type -> Type #

Methods

from :: CFNode -> Rep CFNode x #

to :: Rep CFNode x -> CFNode #

Show CFNode Source # 
Instance details

Defined in ShellCheck.CFG

NFData CFNode Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: CFNode -> () #

Eq CFNode Source # 
Instance details

Defined in ShellCheck.CFG

Methods

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

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

Ord CFNode Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFNode Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFNode = D1 ('MetaData "CFNode" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) (((C1 ('MetaCons "CFStructuralNode" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CFEntryPoint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "CFDropPrefixAssignments" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "CFApplyEffects" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [IdTagged CFEffect])) :+: (C1 ('MetaCons "CFExecuteCommand" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String))) :+: C1 ('MetaCons "CFExecuteSubshell" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Node) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Node)))))) :+: ((C1 ('MetaCons "CFSetExitCode" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id)) :+: (C1 ('MetaCons "CFImpliedExit" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFResolvedExit" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "CFUnresolvedExit" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CFUnreachable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFSetBackgroundPid" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id))))))

data CFEdge Source #

Instances

Instances details
Generic CFEdge Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep CFEdge :: Type -> Type #

Methods

from :: CFEdge -> Rep CFEdge x #

to :: Rep CFEdge x -> CFEdge #

Show CFEdge Source # 
Instance details

Defined in ShellCheck.CFG

NFData CFEdge Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: CFEdge -> () #

Eq CFEdge Source # 
Instance details

Defined in ShellCheck.CFG

Methods

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

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

Ord CFEdge Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFEdge Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFEdge = D1 ('MetaData "CFEdge" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) ((C1 ('MetaCons "CFEErrExit" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFEFlow" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CFEFalseFlow" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFEExit" 'PrefixI 'False) (U1 :: Type -> Type)))

data CFEffect Source #

Instances

Instances details
Generic CFEffect Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep CFEffect :: Type -> Type #

Methods

from :: CFEffect -> Rep CFEffect x #

to :: Rep CFEffect x -> CFEffect #

Show CFEffect Source # 
Instance details

Defined in ShellCheck.CFG

NFData CFEffect Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: CFEffect -> () #

Eq CFEffect Source # 
Instance details

Defined in ShellCheck.CFG

Ord CFEffect Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFEffect Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFEffect = D1 ('MetaData "CFEffect" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) (((C1 ('MetaCons "CFSetProps" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Scope) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set CFVariableProp)))) :+: (C1 ('MetaCons "CFUnsetProps" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Scope) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set CFVariableProp)))) :+: C1 ('MetaCons "CFReadVariable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))) :+: ((C1 ('MetaCons "CFWriteVariable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CFValue)) :+: C1 ('MetaCons "CFWriteGlobal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CFValue))) :+: (C1 ('MetaCons "CFWriteLocal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CFValue)) :+: C1 ('MetaCons "CFWritePrefix" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CFValue))))) :+: ((C1 ('MetaCons "CFDefineFunction" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Node) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Node))) :+: (C1 ('MetaCons "CFUndefine" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "CFUndefineVariable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))) :+: ((C1 ('MetaCons "CFUndefineFunction" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "CFUndefineNameref" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) :+: (C1 ('MetaCons "CFHintArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "CFHintDefined" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))))

data CFStringPart Source #

Instances

Instances details
Generic CFStringPart Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep CFStringPart :: Type -> Type #

Show CFStringPart Source # 
Instance details

Defined in ShellCheck.CFG

NFData CFStringPart Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: CFStringPart -> () #

Eq CFStringPart Source # 
Instance details

Defined in ShellCheck.CFG

Ord CFStringPart Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFStringPart Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFStringPart = D1 ('MetaData "CFStringPart" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) ((C1 ('MetaCons "CFStringLiteral" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "CFStringVariable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) :+: (C1 ('MetaCons "CFStringInteger" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFStringUnknown" 'PrefixI 'False) (U1 :: Type -> Type)))

data CFVariableProp Source #

Instances

Instances details
Generic CFVariableProp Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep CFVariableProp :: Type -> Type #

Show CFVariableProp Source # 
Instance details

Defined in ShellCheck.CFG

NFData CFVariableProp Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: CFVariableProp -> () #

Eq CFVariableProp Source # 
Instance details

Defined in ShellCheck.CFG

Ord CFVariableProp Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFVariableProp Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFVariableProp = D1 ('MetaData "CFVariableProp" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) ((C1 ('MetaCons "CFVPExport" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFVPArray" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CFVPAssociative" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFVPInteger" 'PrefixI 'False) (U1 :: Type -> Type)))

data CFGResult Source #

Instances

Instances details
Show CFGResult Source # 
Instance details

Defined in ShellCheck.CFG

data CFValue Source #

Instances

Instances details
Generic CFValue Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep CFValue :: Type -> Type #

Methods

from :: CFValue -> Rep CFValue x #

to :: Rep CFValue x -> CFValue #

Show CFValue Source # 
Instance details

Defined in ShellCheck.CFG

NFData CFValue Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: CFValue -> () #

Eq CFValue Source # 
Instance details

Defined in ShellCheck.CFG

Methods

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

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

Ord CFValue Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFValue Source # 
Instance details

Defined in ShellCheck.CFG

type Rep CFValue = D1 ('MetaData "CFValue" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) ((C1 ('MetaCons "CFValueUninitialized" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFValueArray" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CFValueString" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CFValueInteger" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CFValueComputed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [CFStringPart])))))

data IdTagged a Source #

Constructors

IdTagged Id a 

Instances

Instances details
Generic (IdTagged a) Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep (IdTagged a) :: Type -> Type #

Methods

from :: IdTagged a -> Rep (IdTagged a) x #

to :: Rep (IdTagged a) x -> IdTagged a #

Show a => Show (IdTagged a) Source # 
Instance details

Defined in ShellCheck.CFG

Methods

showsPrec :: Int -> IdTagged a -> ShowS #

show :: IdTagged a -> String #

showList :: [IdTagged a] -> ShowS #

NFData a => NFData (IdTagged a) Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: IdTagged a -> () #

Eq a => Eq (IdTagged a) Source # 
Instance details

Defined in ShellCheck.CFG

Methods

(==) :: IdTagged a -> IdTagged a -> Bool #

(/=) :: IdTagged a -> IdTagged a -> Bool #

Ord a => Ord (IdTagged a) Source # 
Instance details

Defined in ShellCheck.CFG

Methods

compare :: IdTagged a -> IdTagged a -> Ordering #

(<) :: IdTagged a -> IdTagged a -> Bool #

(<=) :: IdTagged a -> IdTagged a -> Bool #

(>) :: IdTagged a -> IdTagged a -> Bool #

(>=) :: IdTagged a -> IdTagged a -> Bool #

max :: IdTagged a -> IdTagged a -> IdTagged a #

min :: IdTagged a -> IdTagged a -> IdTagged a #

type Rep (IdTagged a) Source # 
Instance details

Defined in ShellCheck.CFG

type Rep (IdTagged a) = D1 ('MetaData "IdTagged" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) (C1 ('MetaCons "IdTagged" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

data Scope Source #

Instances

Instances details
Generic Scope Source # 
Instance details

Defined in ShellCheck.CFG

Associated Types

type Rep Scope :: Type -> Type #

Methods

from :: Scope -> Rep Scope x #

to :: Rep Scope x -> Scope #

Show Scope Source # 
Instance details

Defined in ShellCheck.CFG

Methods

showsPrec :: Int -> Scope -> ShowS #

show :: Scope -> String #

showList :: [Scope] -> ShowS #

NFData Scope Source # 
Instance details

Defined in ShellCheck.CFG

Methods

rnf :: Scope -> () #

Eq Scope Source # 
Instance details

Defined in ShellCheck.CFG

Methods

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

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

Ord Scope Source # 
Instance details

Defined in ShellCheck.CFG

Methods

compare :: Scope -> Scope -> Ordering #

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

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

(>) :: Scope -> Scope -> Bool #

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

max :: Scope -> Scope -> Scope #

min :: Scope -> Scope -> Scope #

type Rep Scope Source # 
Instance details

Defined in ShellCheck.CFG

type Rep Scope = D1 ('MetaData "Scope" "ShellCheck.CFG" "ShellCheck-0.9.0-ERR4cRFEsqS3R6nifd0lsS" 'False) ((C1 ('MetaCons "DefaultScope" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GlobalScope" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LocalScope" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PrefixScope" 'PrefixI 'False) (U1 :: Type -> Type)))