Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
ImportStylePlugin.Config
Synopsis
- data Severity
- data Qualification
- data ModuleAliases
- data NamesList
- data ImportRule = ImportRule {}
- data QualificationStyle
- data ImportRules = ImportRules {
- rules :: [ImportRule]
- severity :: Severity
- data Ban = Ban {}
- data ImportsStyle = ImportsStyle {}
- newtype ModuleName = ModuleName String
Documentation
Report either error or warning during compilation
data Qualification Source #
Instances
FromJSON Qualification Source # | |
Defined in ImportStylePlugin.Config Methods parseJSON :: Value -> Parser Qualification # parseJSONList :: Value -> Parser [Qualification] # | |
Generic Qualification Source # | |
Defined in ImportStylePlugin.Config Associated Types type Rep Qualification :: Type -> Type # | |
Show Qualification Source # | |
Defined in ImportStylePlugin.Config Methods showsPrec :: Int -> Qualification -> ShowS # show :: Qualification -> String # showList :: [Qualification] -> ShowS # | |
type Rep Qualification Source # | |
Defined in ImportStylePlugin.Config |
data ModuleAliases Source #
Instances
FromJSON ModuleAliases Source # | |
Defined in ImportStylePlugin.Config Methods parseJSON :: Value -> Parser ModuleAliases # parseJSONList :: Value -> Parser [ModuleAliases] # | |
Show ModuleAliases Source # | |
Defined in ImportStylePlugin.Config Methods showsPrec :: Int -> ModuleAliases -> ShowS # show :: ModuleAliases -> String # showList :: [ModuleAliases] -> ShowS # |
data ImportRule Source #
Constructors
ImportRule | |
Fields
|
Instances
FromJSON ImportRule Source # | |
Defined in ImportStylePlugin.Config | |
Generic ImportRule Source # | |
Defined in ImportStylePlugin.Config Associated Types type Rep ImportRule :: Type -> Type # | |
Show ImportRule Source # | |
Defined in ImportStylePlugin.Config Methods showsPrec :: Int -> ImportRule -> ShowS # show :: ImportRule -> String # showList :: [ImportRule] -> ShowS # | |
type Rep ImportRule Source # | |
Defined in ImportStylePlugin.Config type Rep ImportRule = D1 ('MetaData "ImportRule" "ImportStylePlugin.Config" "import-style-plugin-0.1.0.0-3mKWth6FJwSHdIC44LJva5" 'False) (C1 ('MetaCons "ImportRule" 'PrefixI 'True) (S1 ('MetaSel ('Just "qualification") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Qualification)) :*: (S1 ('MetaSel ('Just "aliases") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ModuleAliases)) :*: S1 ('MetaSel ('Just "importedNames") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe NamesList))))) |
data QualificationStyle Source #
Instances
FromJSON QualificationStyle Source # | |
Defined in ImportStylePlugin.Config Methods parseJSON :: Value -> Parser QualificationStyle # parseJSONList :: Value -> Parser [QualificationStyle] # | |
Generic QualificationStyle Source # | |
Defined in ImportStylePlugin.Config Associated Types type Rep QualificationStyle :: Type -> Type # Methods from :: QualificationStyle -> Rep QualificationStyle x # to :: Rep QualificationStyle x -> QualificationStyle # | |
Show QualificationStyle Source # | |
Defined in ImportStylePlugin.Config Methods showsPrec :: Int -> QualificationStyle -> ShowS # show :: QualificationStyle -> String # showList :: [QualificationStyle] -> ShowS # | |
type Rep QualificationStyle Source # | |
Defined in ImportStylePlugin.Config |
data ImportRules Source #
Constructors
ImportRules | |
Fields
|
Instances
FromJSON ImportRules Source # | |
Defined in ImportStylePlugin.Config | |
Generic ImportRules Source # | |
Defined in ImportStylePlugin.Config Associated Types type Rep ImportRules :: Type -> Type # | |
Show ImportRules Source # | |
Defined in ImportStylePlugin.Config Methods showsPrec :: Int -> ImportRules -> ShowS # show :: ImportRules -> String # showList :: [ImportRules] -> ShowS # | |
type Rep ImportRules Source # | |
Defined in ImportStylePlugin.Config type Rep ImportRules = D1 ('MetaData "ImportRules" "ImportStylePlugin.Config" "import-style-plugin-0.1.0.0-3mKWth6FJwSHdIC44LJva5" 'False) (C1 ('MetaCons "ImportRules" 'PrefixI 'True) (S1 ('MetaSel ('Just "rules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ImportRule]) :*: S1 ('MetaSel ('Just "severity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Severity))) |
Instances
FromJSON Ban Source # | |
Defined in ImportStylePlugin.Config | |
Generic Ban Source # | |
Show Ban Source # | |
type Rep Ban Source # | |
Defined in ImportStylePlugin.Config type Rep Ban = D1 ('MetaData "Ban" "ImportStylePlugin.Config" "import-style-plugin-0.1.0.0-3mKWth6FJwSHdIC44LJva5" 'False) (C1 ('MetaCons "Ban" 'PrefixI 'True) (S1 ('MetaSel ('Just "severity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Severity) :*: S1 ('MetaSel ('Just "why") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) |
data ImportsStyle Source #
Constructors
ImportsStyle | |
Fields
|
Instances
newtype ModuleName Source #
Constructors
ModuleName String |
Instances
FromJSONKey ModuleName Source # | |
Defined in ImportStylePlugin.Config | |
IsString ModuleName Source # | |
Defined in ImportStylePlugin.Config Methods fromString :: String -> ModuleName # | |
Show ModuleName Source # | |
Defined in ImportStylePlugin.Config Methods showsPrec :: Int -> ModuleName -> ShowS # show :: ModuleName -> String # showList :: [ModuleName] -> ShowS # | |
Eq ModuleName Source # | |
Defined in ImportStylePlugin.Config | |
Ord ModuleName Source # | |
Defined in ImportStylePlugin.Config Methods compare :: ModuleName -> ModuleName -> Ordering # (<) :: ModuleName -> ModuleName -> Bool # (<=) :: ModuleName -> ModuleName -> Bool # (>) :: ModuleName -> ModuleName -> Bool # (>=) :: ModuleName -> ModuleName -> Bool # max :: ModuleName -> ModuleName -> ModuleName # min :: ModuleName -> ModuleName -> ModuleName # |