Safe Haskell | None |
---|---|
Language | Haskell2010 |
Data.OpenApi.Compare.Report
Documentation
generateReport :: ReportConfig -> ReportInput -> (Blocks, ReportStatus) Source #
data CheckerOutput Source #
Constructors
CheckerOutput | |
Fields
|
Instances
Generic CheckerOutput Source # | |
Defined in Data.OpenApi.Compare.Report Associated Types type Rep CheckerOutput :: Type -> Type # | |
Semigroup CheckerOutput Source # | |
Defined in Data.OpenApi.Compare.Report Methods (<>) :: CheckerOutput -> CheckerOutput -> CheckerOutput # sconcat :: NonEmpty CheckerOutput -> CheckerOutput # stimes :: Integral b => b -> CheckerOutput -> CheckerOutput # | |
Monoid CheckerOutput Source # | |
Defined in Data.OpenApi.Compare.Report Methods mempty :: CheckerOutput # mappend :: CheckerOutput -> CheckerOutput -> CheckerOutput # mconcat :: [CheckerOutput] -> CheckerOutput # | |
ToJSON CheckerOutput Source # | |
Defined in Data.OpenApi.Compare.Report Methods toJSON :: CheckerOutput -> Value # toEncoding :: CheckerOutput -> Encoding # toJSONList :: [CheckerOutput] -> Value # toEncodingList :: [CheckerOutput] -> Encoding # | |
type Rep CheckerOutput Source # | |
Defined in Data.OpenApi.Compare.Report |
data ReportInput Source #
Constructors
ReportInput | |
Fields
|
Instances
Generic ReportInput Source # | |
Defined in Data.OpenApi.Compare.Report Associated Types type Rep ReportInput :: Type -> Type # | |
Semigroup ReportInput Source # | |
Defined in Data.OpenApi.Compare.Report Methods (<>) :: ReportInput -> ReportInput -> ReportInput # sconcat :: NonEmpty ReportInput -> ReportInput # stimes :: Integral b => b -> ReportInput -> ReportInput # | |
Monoid ReportInput Source # | |
Defined in Data.OpenApi.Compare.Report Methods mempty :: ReportInput # mappend :: ReportInput -> ReportInput -> ReportInput # mconcat :: [ReportInput] -> ReportInput # | |
ToJSON ReportInput Source # | |
Defined in Data.OpenApi.Compare.Report Methods toJSON :: ReportInput -> Value # toEncoding :: ReportInput -> Encoding # toJSONList :: [ReportInput] -> Value # toEncodingList :: [ReportInput] -> Encoding # | |
type Rep ReportInput Source # | |
Defined in Data.OpenApi.Compare.Report |
data ReportStatus Source #
Constructors
BreakingChanges | |
NoBreakingChanges | |
OnlyUnsupportedChanges | All changes that could be breaking are unsupported – we don't know if there actually are any breaking changes. |
Instances
Eq Pandoc | |
Data Pandoc | |
Defined in Text.Pandoc.Definition Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pandoc -> c Pandoc # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pandoc # toConstr :: Pandoc -> Constr # dataTypeOf :: Pandoc -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pandoc) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pandoc) # gmapT :: (forall b. Data b => b -> b) -> Pandoc -> Pandoc # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pandoc -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pandoc -> r # gmapQ :: (forall d. Data d => d -> u) -> Pandoc -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Pandoc -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pandoc -> m Pandoc # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pandoc -> m Pandoc # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pandoc -> m Pandoc # | |
Ord Pandoc | |
Read Pandoc | |
Show Pandoc | |
Generic Pandoc | |
Semigroup Pandoc | |
Monoid Pandoc | |
NFData Pandoc | |
Defined in Text.Pandoc.Definition | |
ToJSON Pandoc | |
Defined in Text.Pandoc.Definition | |
FromJSON Pandoc | |
HasMeta Pandoc | |
Defined in Text.Pandoc.Builder | |
type Rep Pandoc | |
Defined in Text.Pandoc.Definition type Rep Pandoc = D1 ('MetaData "Pandoc" "Text.Pandoc.Definition" "pandoc-types-1.22.1-EbcKbgjut7s2wZi6fSiAH8" 'False) (C1 ('MetaCons "Pandoc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Meta) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Block]))) |
data ReportConfig Source #
Constructors
ReportConfig | |
Fields |
Instances
Default ReportConfig Source # | |
Defined in Data.OpenApi.Compare.Report Methods def :: ReportConfig # |
data ReportTreeStyle Source #
Constructors
HeadersTreeStyle | |
FoldingBlockquotesTreeStyle |
data ReportMode Source #
Constructors
OnlyErrors | |
All |
Instances
Eq ReportMode Source # | |
Defined in Data.OpenApi.Compare.Report |