Copyright | (c) Andrea Rossato |
---|---|
License | BSD-style (see LICENSE) |
Maintainer | Andrea Rossato <andrea.rossato@unitn.it> |
Stability | unstable |
Portability | unportable |
Safe Haskell | None |
Language | Haskell2010 |
Text.CSL.Style
Description
The Style types
Synopsis
- readCSLString :: String -> [Inline]
- writeCSLString :: [Inline] -> String
- newtype Formatted = Formatted {
- unFormatted :: [Inline]
- data Style = Style {
- styleVersion :: String
- styleClass :: String
- styleInfo :: Maybe CSInfo
- styleDefaultLocale :: String
- styleLocale :: [Locale]
- styleAbbrevs :: Abbreviations
- csOptions :: [Option]
- csMacros :: [MacroMap]
- citation :: Citation
- biblio :: Maybe Bibliography
- data Locale = Locale {
- localeVersion :: String
- localeLang :: String
- localeOptions :: [Option]
- localeTerms :: [CslTerm]
- localeDate :: [Element]
- mergeLocales :: String -> Locale -> [Locale] -> [Locale]
- data CslTerm = CT {
- cslTerm :: String
- termForm :: Form
- termGender :: Gender
- termGenderForm :: Gender
- termSingular :: String
- termPlural :: String
- termMatch :: String
- newTerm :: CslTerm
- findTerm :: String -> Form -> [CslTerm] -> Maybe CslTerm
- findTerm' :: String -> Form -> Gender -> [CslTerm] -> Maybe CslTerm
- newtype Abbreviations = Abbreviations {}
- type MacroMap = (String, [Element])
- data Citation = Citation {}
- data Bibliography = Bibliography {}
- type Option = (String, String)
- mergeOptions :: [Option] -> [Option] -> [Option]
- data Layout = Layout {}
- data Element
- = Choose IfThen [IfThen] [Element]
- | Macro String Formatting
- | Const String Formatting
- | Variable [String] Form Formatting Delimiter
- | Term String Form Formatting Bool
- | Label String Form Formatting Plural
- | Number String NumericForm Formatting
- | Names [String] [Name] Formatting Delimiter [Element]
- | Substitute [Element]
- | Group Formatting Delimiter [Element]
- | Date [String] DateForm Formatting Delimiter [DatePart] String
- data IfThen = IfThen Condition Match [Element]
- data Condition = Condition {
- isType :: [String]
- isSet :: [String]
- isNumeric :: [String]
- isUncertainDate :: [String]
- isPosition :: [String]
- disambiguation :: [String]
- isLocator :: [String]
- type Delimiter = String
- data Match
- match :: Match -> [Bool] -> Bool
- data DatePart = DatePart {
- dpName :: String
- dpForm :: String
- dpRangeDelim :: String
- dpFormatting :: Formatting
- defaultDate :: [DatePart]
- data Sort
- data Sorting
- compare' :: String -> String -> Ordering
- data Form
- data Gender
- data NumericForm
- = Numeric
- | Ordinal
- | Roman
- | LongOrdinal
- data DateForm
- data Plural
- = Contextual
- | Always
- | Never
- data Name
- type NameAttrs = [(String, String)]
- data NamePart = NamePart String Formatting
- isPlural :: Plural -> Int -> Bool
- isName :: Name -> Bool
- isNames :: Element -> Bool
- hasEtAl :: [Name] -> Bool
- data Formatting = Formatting {
- prefix :: String
- suffix :: String
- fontFamily :: String
- fontStyle :: String
- fontVariant :: String
- fontWeight :: String
- textDecoration :: String
- verticalAlign :: String
- textCase :: String
- display :: String
- quotes :: Quote
- stripPeriods :: Bool
- noCase :: Bool
- noDecor :: Bool
- hyperlink :: String
- emptyFormatting :: Formatting
- rmTitleCase :: Formatting -> Formatting
- rmTitleCase' :: Output -> Output
- data Quote
- mergeFM :: Formatting -> Formatting -> Formatting
- data CSInfo = CSInfo {
- csiTitle :: String
- csiAuthor :: CSAuthor
- csiCategories :: [CSCategory]
- csiId :: String
- csiUpdated :: String
- data CSAuthor = CSAuthor String String String
- data CSCategory = CSCategory String String String
- data CiteprocError
- data Output
- = ONull
- | OSpace
- | OPan [Inline]
- | ODel String
- | OStr String Formatting
- | OErr CiteprocError
- | OLabel String Formatting
- | ONum Int Formatting
- | OCitNum Int Formatting
- | OCitLabel String Formatting
- | ODate [Output]
- | OYear String String Formatting
- | OYearSuf String String [Output] Formatting
- | OName Agent [Output] [[Output]] Formatting
- | OContrib String String [Output] [Output] [[Output]]
- | OLoc [Output] Formatting
- | Output [Output] Formatting
- type Citations = [[Cite]]
- data Cite = Cite {}
- emptyCite :: Cite
- data CitationGroup = CG [(Cite, Output)] Formatting Delimiter [(Cite, Output)]
- data BiblioData = BD {
- citations :: [Formatted]
- bibliography :: [Formatted]
- citationIds :: [String]
- data CiteData = CD {}
- data NameData = ND {
- nameKey :: Agent
- nameCollision :: [Output]
- nameDisambData :: [[Output]]
- nameDataSolved :: [Output]
- isPunctuationInQuote :: Style -> Bool
- object' :: [Pair] -> Value
- data Agent = Agent {}
- emptyAgent :: Agent
Documentation
readCSLString :: String -> [Inline] Source #
writeCSLString :: [Inline] -> String Source #
Constructors
Formatted | |
Fields
|
Instances
The representation of a parsed CSL style.
Constructors
Style | |
Fields
|
Instances
Constructors
Locale | |
Fields
|
Instances
Eq Locale Source # | |
Data Locale Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Locale -> c Locale Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Locale Source # toConstr :: Locale -> Constr Source # dataTypeOf :: Locale -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Locale) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Locale) Source # gmapT :: (forall b. Data b => b -> b) -> Locale -> Locale Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Locale -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Locale -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Locale -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Locale -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Locale -> m Locale Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Locale -> m Locale Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Locale -> m Locale Source # | |
Read Locale Source # | |
Show Locale Source # | |
Generic Locale Source # | |
type Rep Locale Source # | |
Defined in Text.CSL.Style type Rep Locale = D1 (MetaData "Locale" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "Locale" PrefixI True) ((S1 (MetaSel (Just "localeVersion") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String) :*: S1 (MetaSel (Just "localeLang") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :*: (S1 (MetaSel (Just "localeOptions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Option]) :*: (S1 (MetaSel (Just "localeTerms") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [CslTerm]) :*: S1 (MetaSel (Just "localeDate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Element]))))) |
Constructors
CT | |
Fields
|
Instances
newtype Abbreviations Source #
Constructors
Abbreviations | |
Instances
Instances
Data Citation Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Citation -> c Citation Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Citation Source # toConstr :: Citation -> Constr Source # dataTypeOf :: Citation -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Citation) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Citation) Source # gmapT :: (forall b. Data b => b -> b) -> Citation -> Citation Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Citation -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Citation -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Citation -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Citation -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Citation -> m Citation Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Citation -> m Citation Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Citation -> m Citation Source # | |
Read Citation Source # | |
Show Citation Source # | |
Generic Citation Source # | |
type Rep Citation Source # | |
Defined in Text.CSL.Style type Rep Citation = D1 (MetaData "Citation" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "Citation" PrefixI True) (S1 (MetaSel (Just "citOptions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Option]) :*: (S1 (MetaSel (Just "citSort") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Sort]) :*: S1 (MetaSel (Just "citLayout") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Layout)))) |
data Bibliography Source #
Constructors
Bibliography | |
Instances
Instances
Data Layout Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Layout -> c Layout Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Layout Source # toConstr :: Layout -> Constr Source # dataTypeOf :: Layout -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Layout) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Layout) Source # gmapT :: (forall b. Data b => b -> b) -> Layout -> Layout Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Layout -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Layout -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Layout -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Layout -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Layout -> m Layout Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Layout -> m Layout Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Layout -> m Layout Source # | |
Read Layout Source # | |
Show Layout Source # | |
Generic Layout Source # | |
type Rep Layout Source # | |
Defined in Text.CSL.Style type Rep Layout = D1 (MetaData "Layout" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "Layout" PrefixI True) (S1 (MetaSel (Just "layFormat") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Formatting) :*: (S1 (MetaSel (Just "layDelim") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Delimiter) :*: S1 (MetaSel (Just "elements") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Element])))) |
Constructors
Instances
Instances
Eq IfThen Source # | |
Data IfThen Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IfThen -> c IfThen Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IfThen Source # toConstr :: IfThen -> Constr Source # dataTypeOf :: IfThen -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IfThen) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IfThen) Source # gmapT :: (forall b. Data b => b -> b) -> IfThen -> IfThen Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IfThen -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IfThen -> r Source # gmapQ :: (forall d. Data d => d -> u) -> IfThen -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> IfThen -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> IfThen -> m IfThen Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IfThen -> m IfThen Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IfThen -> m IfThen Source # | |
Read IfThen Source # | |
Show IfThen Source # | |
Generic IfThen Source # | |
type Rep IfThen Source # | |
Defined in Text.CSL.Style type Rep IfThen = D1 (MetaData "IfThen" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "IfThen" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Condition) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Match) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Element])))) |
Constructors
Condition | |
Fields
|
Instances
Instances
Eq Match Source # | |
Data Match Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Match -> c Match Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Match Source # toConstr :: Match -> Constr Source # dataTypeOf :: Match -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Match) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Match) Source # gmapT :: (forall b. Data b => b -> b) -> Match -> Match Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Match -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Match -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Match -> m Match Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match Source # | |
Read Match Source # | |
Show Match Source # | |
Generic Match Source # | |
type Rep Match Source # | |
Defined in Text.CSL.Style |
Constructors
DatePart | |
Fields
|
Instances
defaultDate :: [DatePart] Source #
Instances
Constructors
Ascending String | |
Descending String |
Instances
Eq Sorting Source # | |
Data Sorting Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sorting -> c Sorting Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Sorting Source # toConstr :: Sorting -> Constr Source # dataTypeOf :: Sorting -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Sorting) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Sorting) Source # gmapT :: (forall b. Data b => b -> b) -> Sorting -> Sorting Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sorting -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sorting -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Sorting -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Sorting -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sorting -> m Sorting Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sorting -> m Sorting Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sorting -> m Sorting Source # | |
Ord Sorting Source # | |
Read Sorting Source # | |
Show Sorting Source # | |
Generic Sorting Source # | |
type Rep Sorting Source # | |
Defined in Text.CSL.Style type Rep Sorting = D1 (MetaData "Sorting" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "Ascending" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: C1 (MetaCons "Descending" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String))) |
Instances
Eq Form Source # | |
Data Form Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Form -> c Form Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Form Source # toConstr :: Form -> Constr Source # dataTypeOf :: Form -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Form) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Form) Source # gmapT :: (forall b. Data b => b -> b) -> Form -> Form Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Form -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Form -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Form -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Form -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Form -> m Form Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Form -> m Form Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Form -> m Form Source # | |
Read Form Source # | |
Show Form Source # | |
Generic Form Source # | |
type Rep Form Source # | |
Defined in Text.CSL.Style type Rep Form = D1 (MetaData "Form" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) ((C1 (MetaCons "Long" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Short" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Count" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Verb" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "VerbShort" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Symbol" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotSet" PrefixI False) (U1 :: Type -> Type)))) |
Instances
Eq Gender Source # | |
Data Gender Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Gender -> c Gender Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Gender Source # toConstr :: Gender -> Constr Source # dataTypeOf :: Gender -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Gender) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Gender) Source # gmapT :: (forall b. Data b => b -> b) -> Gender -> Gender Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Gender -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Gender -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Gender -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Gender -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Gender -> m Gender Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Gender -> m Gender Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Gender -> m Gender Source # | |
Read Gender Source # | |
Show Gender Source # | |
Generic Gender Source # | |
type Rep Gender Source # | |
Defined in Text.CSL.Style type Rep Gender = D1 (MetaData "Gender" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "Feminine" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Masculine" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Neuter" PrefixI False) (U1 :: Type -> Type))) |
data NumericForm Source #
Constructors
Numeric | |
Ordinal | |
Roman | |
LongOrdinal |
Instances
Eq NumericForm Source # | |
Defined in Text.CSL.Style Methods (==) :: NumericForm -> NumericForm -> Bool Source # (/=) :: NumericForm -> NumericForm -> Bool Source # | |
Data NumericForm Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NumericForm -> c NumericForm Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NumericForm Source # toConstr :: NumericForm -> Constr Source # dataTypeOf :: NumericForm -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NumericForm) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NumericForm) Source # gmapT :: (forall b. Data b => b -> b) -> NumericForm -> NumericForm Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NumericForm -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NumericForm -> r Source # gmapQ :: (forall d. Data d => d -> u) -> NumericForm -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> NumericForm -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NumericForm -> m NumericForm Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NumericForm -> m NumericForm Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NumericForm -> m NumericForm Source # | |
Read NumericForm Source # | |
Defined in Text.CSL.Style | |
Show NumericForm Source # | |
Defined in Text.CSL.Style | |
Generic NumericForm Source # | |
Defined in Text.CSL.Style Methods from :: NumericForm -> Rep NumericForm x Source # to :: Rep NumericForm x -> NumericForm Source # | |
type Rep NumericForm Source # | |
Defined in Text.CSL.Style type Rep NumericForm = D1 (MetaData "NumericForm" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) ((C1 (MetaCons "Numeric" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ordinal" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Roman" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LongOrdinal" PrefixI False) (U1 :: Type -> Type))) |
Constructors
TextDate | |
NumericDate | |
NoFormDate |
Instances
Eq DateForm Source # | |
Data DateForm Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DateForm -> c DateForm Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DateForm Source # toConstr :: DateForm -> Constr Source # dataTypeOf :: DateForm -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DateForm) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DateForm) Source # gmapT :: (forall b. Data b => b -> b) -> DateForm -> DateForm Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DateForm -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DateForm -> r Source # gmapQ :: (forall d. Data d => d -> u) -> DateForm -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> DateForm -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DateForm -> m DateForm Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DateForm -> m DateForm Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DateForm -> m DateForm Source # | |
Read DateForm Source # | |
Show DateForm Source # | |
Generic DateForm Source # | |
type Rep DateForm Source # | |
Defined in Text.CSL.Style type Rep DateForm = D1 (MetaData "DateForm" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "TextDate" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NumericDate" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NoFormDate" PrefixI False) (U1 :: Type -> Type))) |
Constructors
Contextual | |
Always | |
Never |
Instances
Eq Plural Source # | |
Data Plural Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Plural -> c Plural Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Plural Source # toConstr :: Plural -> Constr Source # dataTypeOf :: Plural -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Plural) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Plural) Source # gmapT :: (forall b. Data b => b -> b) -> Plural -> Plural Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Plural -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Plural -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Plural -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Plural -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Plural -> m Plural Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Plural -> m Plural Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Plural -> m Plural Source # | |
Read Plural Source # | |
Show Plural Source # | |
Generic Plural Source # | |
type Rep Plural Source # | |
Defined in Text.CSL.Style type Rep Plural = D1 (MetaData "Plural" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "Contextual" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Always" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Never" PrefixI False) (U1 :: Type -> Type))) |
Constructors
Name Form Formatting NameAttrs Delimiter [NamePart] | |
NameLabel Form Formatting Plural | |
EtAl Formatting String |
Instances
Constructors
NamePart String Formatting |
Instances
Eq NamePart Source # | |
Data NamePart Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NamePart -> c NamePart Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NamePart Source # toConstr :: NamePart -> Constr Source # dataTypeOf :: NamePart -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NamePart) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NamePart) Source # gmapT :: (forall b. Data b => b -> b) -> NamePart -> NamePart Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NamePart -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NamePart -> r Source # gmapQ :: (forall d. Data d => d -> u) -> NamePart -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> NamePart -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NamePart -> m NamePart Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NamePart -> m NamePart Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NamePart -> m NamePart Source # | |
Read NamePart Source # | |
Show NamePart Source # | |
Generic NamePart Source # | |
type Rep NamePart Source # | |
Defined in Text.CSL.Style type Rep NamePart = D1 (MetaData "NamePart" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "NamePart" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Formatting))) |
data Formatting Source #
Constructors
Formatting | |
Fields
|
Instances
rmTitleCase :: Formatting -> Formatting Source #
rmTitleCase' :: Output -> Output Source #
Constructors
NativeQuote | |
ParsedQuote | |
NoQuote |
Instances
Eq Quote Source # | |
Data Quote Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Quote -> c Quote Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Quote Source # toConstr :: Quote -> Constr Source # dataTypeOf :: Quote -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Quote) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Quote) Source # gmapT :: (forall b. Data b => b -> b) -> Quote -> Quote Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Quote -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Quote -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Quote -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Quote -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Quote -> m Quote Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Quote -> m Quote Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Quote -> m Quote Source # | |
Ord Quote Source # | |
Defined in Text.CSL.Style | |
Read Quote Source # | |
Show Quote Source # | |
Generic Quote Source # | |
type Rep Quote Source # | |
Defined in Text.CSL.Style type Rep Quote = D1 (MetaData "Quote" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "NativeQuote" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ParsedQuote" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NoQuote" PrefixI False) (U1 :: Type -> Type))) |
mergeFM :: Formatting -> Formatting -> Formatting Source #
Constructors
CSInfo | |
Fields
|
Instances
Data CSInfo Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CSInfo -> c CSInfo Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CSInfo Source # toConstr :: CSInfo -> Constr Source # dataTypeOf :: CSInfo -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CSInfo) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CSInfo) Source # gmapT :: (forall b. Data b => b -> b) -> CSInfo -> CSInfo Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CSInfo -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CSInfo -> r Source # gmapQ :: (forall d. Data d => d -> u) -> CSInfo -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> CSInfo -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CSInfo -> m CSInfo Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CSInfo -> m CSInfo Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CSInfo -> m CSInfo Source # | |
Read CSInfo Source # | |
Show CSInfo Source # | |
Generic CSInfo Source # | |
type Rep CSInfo Source # | |
Defined in Text.CSL.Style type Rep CSInfo = D1 (MetaData "CSInfo" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "CSInfo" PrefixI True) ((S1 (MetaSel (Just "csiTitle") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String) :*: S1 (MetaSel (Just "csiAuthor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CSAuthor)) :*: (S1 (MetaSel (Just "csiCategories") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [CSCategory]) :*: (S1 (MetaSel (Just "csiId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String) :*: S1 (MetaSel (Just "csiUpdated") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String))))) |
Instances
data CSCategory Source #
Constructors
CSCategory String String String |
Instances
data CiteprocError Source #
Constructors
NoOutput | |
ReferenceNotFound String |
Instances
The Output
generated by the evaluation of a style. Must be
further processed for disambiguation and collapsing.
Constructors
ONull | |
OSpace | |
OPan [Inline] | |
ODel String | A delimiter string. |
OStr String Formatting | A simple |
OErr CiteprocError | Warning message |
OLabel String Formatting | A label used for roles |
ONum Int Formatting | A number (used to count contributors) |
OCitNum Int Formatting | The citation number |
OCitLabel String Formatting | The citation label |
ODate [Output] | A (possibly) ranged date |
OYear String String Formatting | The year and the citeId |
OYearSuf String String [Output] Formatting | The year suffix, the citeId and a holder for collision data |
OName Agent [Output] [[Output]] Formatting | A (family) name with the list of given names. |
OContrib String String [Output] [Output] [[Output]] | The citation key, the role (author, editor, etc.), the contributor(s), the output needed for year suf. disambiguation, and everything used for name disambiguation. |
OLoc [Output] Formatting | The citation's locator |
Output [Output] Formatting | Some nested |
Instances
Constructors
Cite | |
Fields
|
Instances
data CitationGroup Source #
A citation group: the first list has a single member when the
citation group starts with an "author-in-text" cite, the
Formatting
to be applied, the Delimiter
between individual
citations and the list of evaluated citations.
Instances
data BiblioData Source #
Constructors
BD | |
Fields
|
Instances
Data BiblioData Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BiblioData -> c BiblioData Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BiblioData Source # toConstr :: BiblioData -> Constr Source # dataTypeOf :: BiblioData -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BiblioData) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BiblioData) Source # gmapT :: (forall b. Data b => b -> b) -> BiblioData -> BiblioData Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BiblioData -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BiblioData -> r Source # gmapQ :: (forall d. Data d => d -> u) -> BiblioData -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> BiblioData -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> BiblioData -> m BiblioData Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BiblioData -> m BiblioData Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BiblioData -> m BiblioData Source # | |
Show BiblioData Source # | |
Defined in Text.CSL.Style | |
Generic BiblioData Source # | |
Defined in Text.CSL.Style | |
type Rep BiblioData Source # | |
Defined in Text.CSL.Style type Rep BiblioData = D1 (MetaData "BiblioData" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "BD" PrefixI True) (S1 (MetaSel (Just "citations") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Formatted]) :*: (S1 (MetaSel (Just "bibliography") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Formatted]) :*: S1 (MetaSel (Just "citationIds") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String])))) |
A record with all the data to produce the Formatted
of a
citation: the citation key, the part of the formatted citation that
may be colliding with other citations, the form of the citation
when a year suffix is used for disambiguation , the data to
disambiguate it (all possible contributors and all possible given
names), and, after processing, the disambiguated citation and its
year, initially empty.
Constructors
CD | |
Instances
Constructors
ND | |
Fields
|
Instances
Eq NameData Source # | |
Data NameData Source # | |
Defined in Text.CSL.Style Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameData -> c NameData Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameData Source # toConstr :: NameData -> Constr Source # dataTypeOf :: NameData -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameData) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameData) Source # gmapT :: (forall b. Data b => b -> b) -> NameData -> NameData Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameData -> r Source # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameData -> r Source # gmapQ :: (forall d. Data d => d -> u) -> NameData -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> NameData -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameData -> m NameData Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameData -> m NameData Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameData -> m NameData Source # | |
Show NameData Source # | |
Generic NameData Source # | |
type Rep NameData Source # | |
Defined in Text.CSL.Style type Rep NameData = D1 (MetaData "NameData" "Text.CSL.Style" "pandoc-citeproc-0.15.0.1-9QuB3rhhIv8B1lFrQZZkE7" False) (C1 (MetaCons "ND" PrefixI True) ((S1 (MetaSel (Just "nameKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Agent) :*: S1 (MetaSel (Just "nameCollision") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Output])) :*: (S1 (MetaSel (Just "nameDisambData") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [[Output]]) :*: S1 (MetaSel (Just "nameDataSolved") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Output])))) |
isPunctuationInQuote :: Style -> Bool Source #
Constructors
Agent | |
Fields
|
Instances
emptyAgent :: Agent Source #