Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Citeproc.Types
Synopsis
- data CiteprocOptions = CiteprocOptions {
- linkCitations :: Bool
- linkBibliography :: Bool
- defaultCiteprocOptions :: CiteprocOptions
- class (Semigroup a, Monoid a, Show a, Eq a, Ord a) => CiteprocOutput a where
- toText :: a -> Text
- fromText :: Text -> a
- dropTextWhile :: (Char -> Bool) -> a -> a
- dropTextWhileEnd :: (Char -> Bool) -> a -> a
- addFontVariant :: FontVariant -> a -> a
- addFontStyle :: FontStyle -> a -> a
- addFontWeight :: FontWeight -> a -> a
- addTextDecoration :: TextDecoration -> a -> a
- addVerticalAlign :: VerticalAlign -> a -> a
- addTextCase :: Maybe Lang -> TextCase -> a -> a
- addDisplay :: DisplayStyle -> a -> a
- addQuotes :: a -> a
- movePunctuationInsideQuotes :: a -> a
- inNote :: a -> a
- mapText :: (Text -> Text) -> a -> a
- addHyperlink :: Text -> a -> a
- localizeQuotes :: Locale -> a -> a
- addFormatting :: CiteprocOutput a => Formatting -> a -> a
- data CiteprocError
- = CiteprocXMLError Text
- | CiteprocParseError Text
- | CiteprocLocaleNotFound Text
- prettyCiteprocError :: CiteprocError -> Text
- newtype ItemId = ItemId {
- unItemId :: Text
- data CitationItem a = CitationItem {
- citationItemId :: ItemId
- citationItemLabel :: Maybe Text
- citationItemLocator :: Maybe Text
- citationItemType :: CitationItemType
- citationItemPrefix :: Maybe a
- citationItemSuffix :: Maybe a
- citationItemData :: Maybe (Reference a)
- data CitationItemType
- data Citation a = Citation {
- citationId :: Maybe Text
- citationNoteNumber :: Maybe Int
- citationItems :: [CitationItem a]
- data ElementType a
- data Element a = Element (ElementType a) Formatting
- data NumberForm
- data Pluralize
- data DateType
- data Date = Date {
- dateParts :: [DateParts]
- dateCirca :: Bool
- dateSeason :: Maybe Int
- dateLiteral :: Maybe Text
- rawDateEDTF :: Text -> Maybe Date
- newtype DateParts = DateParts [Int]
- data ShowDateParts
- data DPName
- data DPForm
- data DP = DP {
- dpName :: DPName
- dpForm :: DPForm
- dpRangeDelimiter :: Text
- dpFormatting :: Formatting
- data VariableForm
- data TextType
- = TextVariable VariableForm Variable
- | TextMacro Text
- | TextTerm Term
- | TextValue Text
- data NameFormat = NameFormat {
- nameGivenFormatting :: Maybe Formatting
- nameFamilyFormatting :: Maybe Formatting
- nameAndStyle :: Maybe TermForm
- nameDelimiter :: Text
- nameDelimiterPrecedesEtAl :: DelimiterPrecedes
- nameDelimiterPrecedesLast :: DelimiterPrecedes
- nameEtAlMin :: Maybe Int
- nameEtAlUseFirst :: Maybe Int
- nameEtAlSubsequentUseFirst :: Maybe Int
- nameEtAlSubsequentMin :: Maybe Int
- nameEtAlUseLast :: Bool
- nameForm :: NameForm
- nameInitialize :: Bool
- nameInitializeWith :: Maybe Text
- nameAsSortOrder :: Maybe NameAsSortOrder
- nameSortSeparator :: Text
- defaultNameFormat :: NameFormat
- data NameAsSortOrder
- data NamesFormat = NamesFormat {
- namesLabel :: Maybe (TermForm, Pluralize, Formatting)
- namesEtAl :: Maybe (Text, Formatting)
- namesName :: Maybe (NameFormat, Formatting)
- namesLabelBeforeName :: Bool
- data NameForm
- data Name = Name {
- nameFamily :: Maybe Text
- nameGiven :: Maybe Text
- nameDroppingParticle :: Maybe Text
- nameNonDroppingParticle :: Maybe Text
- nameSuffix :: Maybe Text
- nameCommaSuffix :: Bool
- nameStaticOrdering :: Bool
- nameLiteral :: Maybe Text
- extractParticles :: Name -> Name
- isByzantineName :: Name -> Bool
- data DelimiterPrecedes
- data Condition
- data Position
- data Match
- data Formatting = Formatting {
- formatLang :: Maybe Lang
- formatFontStyle :: Maybe FontStyle
- formatFontVariant :: Maybe FontVariant
- formatFontWeight :: Maybe FontWeight
- formatTextDecoration :: Maybe TextDecoration
- formatVerticalAlign :: Maybe VerticalAlign
- formatPrefix :: Maybe Text
- formatSuffix :: Maybe Text
- formatDisplay :: Maybe DisplayStyle
- formatTextCase :: Maybe TextCase
- formatDelimiter :: Maybe Text
- formatStripPeriods :: Bool
- formatQuotes :: Bool
- formatAffixesInside :: Bool
- data FontStyle
- data FontVariant
- data FontWeight
- data TextDecoration
- data VerticalAlign
- data DisplayStyle
- data TextCase
- data DemoteNonDroppingParticle
- data StyleOptions = StyleOptions {
- styleIsNoteStyle :: Bool
- styleDefaultLocale :: Maybe Lang
- styleDemoteNonDroppingParticle :: DemoteNonDroppingParticle
- styleInitializeWithHyphen :: Bool
- stylePageRangeFormat :: Maybe PageRangeFormat
- stylePageRangeDelimiter :: Maybe Text
- styleDisambiguation :: DisambiguationStrategy
- styleNearNoteDistance :: Maybe Int
- styleCiteGroupDelimiter :: Maybe Text
- styleLineSpacing :: Maybe Int
- styleEntrySpacing :: Maybe Int
- styleHangingIndent :: Bool
- styleSecondFieldAlign :: Maybe SecondFieldAlign
- styleSubsequentAuthorSubstitute :: Maybe SubsequentAuthorSubstitute
- styleUsesYearSuffixVariable :: Bool
- data SubsequentAuthorSubstitute = SubsequentAuthorSubstitute Text SubsequentAuthorSubstituteRule
- data SubsequentAuthorSubstituteRule
- data SecondFieldAlign
- data PageRangeFormat
- data Style a = Style {
- styleCslVersion :: (Int, Int, Int)
- styleOptions :: StyleOptions
- styleCitation :: Layout a
- styleBibliography :: Maybe (Layout a)
- styleLocales :: [Locale]
- styleAbbreviations :: Maybe Abbreviations
- data TermMatch
- data TermGender
- data TermNumber
- data TermForm
- data Term = Term {
- termName :: Text
- termForm :: TermForm
- termNumber :: Maybe TermNumber
- termGender :: Maybe TermGender
- termGenderForm :: Maybe TermGender
- termMatch :: Maybe TermMatch
- emptyTerm :: Term
- data SortDirection
- data SortKey a
- data SortKeyValue = SortKeyValue SortDirection (Maybe [Text])
- data LayoutOptions = LayoutOptions {
- layoutCollapse :: Maybe Collapsing
- layoutYearSuffixDelimiter :: Maybe Text
- layoutAfterCollapseDelimiter :: Maybe Text
- data Collapsing
- data Layout a = Layout {
- layoutOptions :: LayoutOptions
- layoutFormatting :: Formatting
- layoutElements :: [Element a]
- layoutSortKeys :: [SortKey a]
- data DisambiguationStrategy = DisambiguationStrategy {
- disambiguateAddNames :: Bool
- disambiguateAddGivenNames :: Maybe GivenNameDisambiguationRule
- disambiguateAddYearSuffix :: Bool
- data GivenNameDisambiguationRule
- data Lang = Lang {
- langLanguage :: Text
- langScript :: Maybe Text
- langRegion :: Maybe Text
- langVariants :: [Text]
- langExtensions :: [(Text, [(Text, Text)])]
- langPrivateUse :: [Text]
- parseLang :: Text -> Either String Lang
- renderLang :: Lang -> Text
- data Locale = Locale {
- localeLanguage :: Maybe Lang
- localePunctuationInQuote :: Maybe Bool
- localeLimitDayOrdinalsToDay1 :: Maybe Bool
- localeDate :: Map DateType (Element Text)
- localeTerms :: Map Text [(Term, Text)]
- data DisambiguationData = DisambiguationData {
- disambYearSuffix :: Maybe Int
- disambNameMap :: Map Name NameHints
- disambEtAlNames :: Maybe Int
- disambCondition :: Bool
- data NameHints
- data Reference a = Reference {
- referenceId :: ItemId
- referenceType :: Text
- referenceDisambiguation :: Maybe DisambiguationData
- referenceVariables :: Map Variable (Val a)
- newtype ReferenceMap a = ReferenceMap {
- unReferenceMap :: Map ItemId (Reference a)
- makeReferenceMap :: [Reference a] -> ([Reference a], ReferenceMap a)
- lookupReference :: ItemId -> ReferenceMap a -> Maybe (Reference a)
- data Val a
- valToText :: CiteprocOutput a => Val a -> Maybe Text
- data Variable
- toVariable :: Text -> Variable
- fromVariable :: Variable -> Text
- lookupVariable :: CiteprocOutput a => Variable -> Reference a -> Maybe (Val a)
- data Output a
- data Identifier
- = IdentDOI Text
- | IdentPMCID Text
- | IdentPMID Text
- | IdentURL Text
- identifierToURL :: Identifier -> Text
- fixShortDOI :: Text -> Text
- data Tag
- outputToText :: CiteprocOutput a => Output a -> Text
- renderOutput :: CiteprocOutput a => CiteprocOptions -> Output a -> a
- grouped :: [Output a] -> Output a
- formatted :: Formatting -> [Output a] -> Output a
- readAsInt :: Text -> Maybe Int
- variableType :: Variable -> VariableType
- data VariableType
- data Abbreviations
- lookupAbbreviation :: CiteprocOutput a => Variable -> Val a -> Abbreviations -> Maybe (Val a)
- data Result a = Result {
- resultCitations :: [a]
- resultBibliography :: [(Text, a)]
- resultWarnings :: [Text]
- data Inputs a = Inputs {
- inputsCitations :: Maybe [Citation a]
- inputsReferences :: Maybe [Reference a]
- inputsStyle :: Maybe Text
- inputsAbbreviations :: Maybe Abbreviations
- inputsLang :: Maybe Lang
Documentation
data CiteprocOptions #
Options affecting the output in ways that go beyond what can be specified in styles.
Constructors
CiteprocOptions | |
Fields
|
Instances
Show CiteprocOptions # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> CiteprocOptions -> ShowS show :: CiteprocOptions -> String showList :: [CiteprocOptions] -> ShowS | |
Eq CiteprocOptions # | |
Defined in Citeproc.Types Methods (==) :: CiteprocOptions -> CiteprocOptions -> Bool (/=) :: CiteprocOptions -> CiteprocOptions -> Bool |
class (Semigroup a, Monoid a, Show a, Eq a, Ord a) => CiteprocOutput a where #
CSL styles require certain formatting transformations to
be defined. These are defined in the CiteprocOutput
class.
The library may be used with any structured format that defines
these operations. See the CslJson
module for an instance
that corresponds to the markup allowed in CSL JSON. See
the Pandoc
module for an instance for Pandoc Inlines
.
Methods
dropTextWhile :: (Char -> Bool) -> a -> a #
dropTextWhileEnd :: (Char -> Bool) -> a -> a #
addFontVariant :: FontVariant -> a -> a #
addFontStyle :: FontStyle -> a -> a #
addFontWeight :: FontWeight -> a -> a #
addTextDecoration :: TextDecoration -> a -> a #
addVerticalAlign :: VerticalAlign -> a -> a #
addTextCase :: Maybe Lang -> TextCase -> a -> a #
addDisplay :: DisplayStyle -> a -> a #
movePunctuationInsideQuotes :: a -> a #
mapText :: (Text -> Text) -> a -> a #
addHyperlink :: Text -> a -> a #
localizeQuotes :: Locale -> a -> a #
Instances
addFormatting :: CiteprocOutput a => Formatting -> a -> a #
data CiteprocError #
Constructors
CiteprocXMLError Text | |
CiteprocParseError Text | |
CiteprocLocaleNotFound Text |
Instances
Show CiteprocError # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> CiteprocError -> ShowS show :: CiteprocError -> String showList :: [CiteprocError] -> ShowS | |
Eq CiteprocError # | |
Defined in Citeproc.Types |
prettyCiteprocError :: CiteprocError -> Text #
The identifier used to identify a work in a bibliographic database.
data CitationItem a #
The part of a citation corresponding to a single work, possibly including a label, locator, prefix and suffix.
Constructors
CitationItem | |
Fields
|
Instances
data CitationItemType #
Constructors
AuthorOnly | e.g., Smith |
SuppressAuthor | e.g., (2000, p. 30) |
NormalCite | e.g., (Smith 2000, p. 30) |
Instances
A citation (which may include several items, e.g.
in (Smith 2000; Jones 2010, p. 30)
).
Constructors
Citation | |
Fields
|
Instances
(FromJSON a, Eq a) => FromJSON (Citation a) # | |
Defined in Citeproc.Types | |
ToJSON a => ToJSON (Citation a) # | |
Defined in Citeproc.Types | |
Show a => Show (Citation a) # | |
Eq a => Eq (Citation a) # | |
Ord a => Ord (Citation a) # | |
data ElementType a #
Constructors
EText TextType | |
EDate Variable DateType (Maybe ShowDateParts) [DP] | |
ENumber Variable NumberForm | |
ENames [Variable] NamesFormat [Element a] | |
ELabel Variable TermForm Pluralize | |
EGroup Bool [Element a] | |
EChoose [(Match, [Condition], [Element a])] |
Instances
Show (ElementType a) # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> ElementType a -> ShowS show :: ElementType a -> String showList :: [ElementType a] -> ShowS | |
Eq (ElementType a) # | |
Defined in Citeproc.Types |
Constructors
Element (ElementType a) Formatting |
data NumberForm #
Constructors
NumberNumeric | |
NumberOrdinal | |
NumberLongOrdinal | |
NumberRoman |
Instances
Show NumberForm # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> NumberForm -> ShowS show :: NumberForm -> String showList :: [NumberForm] -> ShowS | |
Eq NumberForm # | |
Defined in Citeproc.Types |
Constructors
ContextualPluralize | |
AlwaysPluralize | |
NeverPluralize |
Constructors
LocalizedNumeric | |
LocalizedText | |
NonLocalized |
Constructors
Date | |
Fields
|
rawDateEDTF :: Text -> Maybe Date #
Constructors
DateParts [Int] |
Instances
FromJSON DateParts # | |
Defined in Citeproc.Types | |
ToJSON DateParts # | |
Defined in Citeproc.Types | |
Show DateParts # | |
Eq DateParts # | |
Ord DateParts # | |
Defined in Citeproc.Types |
data ShowDateParts #
Constructors
YearMonthDay | |
YearMonth | |
Year |
Instances
Show ShowDateParts # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> ShowDateParts -> ShowS show :: ShowDateParts -> String showList :: [ShowDateParts] -> ShowS | |
Eq ShowDateParts # | |
Defined in Citeproc.Types |
Constructors
DPNumeric | |
DPNumericLeadingZeros | |
DPOrdinal | |
DPLong | |
DPShort |
Constructors
DP | |
Fields
|
data VariableForm #
Instances
Show VariableForm # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> VariableForm -> ShowS show :: VariableForm -> String showList :: [VariableForm] -> ShowS | |
Eq VariableForm # | |
Defined in Citeproc.Types |
Constructors
TextVariable VariableForm Variable | |
TextMacro Text | |
TextTerm Term | |
TextValue Text |
data NameFormat #
Constructors
NameFormat | |
Fields
|
Instances
Show NameFormat # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> NameFormat -> ShowS show :: NameFormat -> String showList :: [NameFormat] -> ShowS | |
Eq NameFormat # | |
Defined in Citeproc.Types |
data NameAsSortOrder #
Constructors
NameAsSortOrderFirst | |
NameAsSortOrderAll |
Instances
Show NameAsSortOrder # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> NameAsSortOrder -> ShowS show :: NameAsSortOrder -> String showList :: [NameAsSortOrder] -> ShowS | |
Eq NameAsSortOrder # | |
Defined in Citeproc.Types Methods (==) :: NameAsSortOrder -> NameAsSortOrder -> Bool (/=) :: NameAsSortOrder -> NameAsSortOrder -> Bool |
data NamesFormat #
Constructors
NamesFormat | |
Fields
|
Instances
Show NamesFormat # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> NamesFormat -> ShowS show :: NamesFormat -> String showList :: [NamesFormat] -> ShowS | |
Eq NamesFormat # | |
Defined in Citeproc.Types |
Constructors
Name | |
Fields
|
extractParticles :: Name -> Name #
isByzantineName :: Name -> Bool #
data DelimiterPrecedes #
Instances
Show DelimiterPrecedes # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> DelimiterPrecedes -> ShowS show :: DelimiterPrecedes -> String showList :: [DelimiterPrecedes] -> ShowS | |
Eq DelimiterPrecedes # | |
Defined in Citeproc.Types Methods (==) :: DelimiterPrecedes -> DelimiterPrecedes -> Bool (/=) :: DelimiterPrecedes -> DelimiterPrecedes -> Bool |
Constructors
FirstPosition | |
IbidWithLocator | |
Ibid | |
NearNote | |
Subsequent |
data Formatting #
Constructors
Formatting | |
Fields
|
Instances
Monoid Formatting # | |
Defined in Citeproc.Types Methods mempty :: Formatting mappend :: Formatting -> Formatting -> Formatting mconcat :: [Formatting] -> Formatting | |
Semigroup Formatting # | |
Defined in Citeproc.Types Methods (<>) :: Formatting -> Formatting -> Formatting # sconcat :: NonEmpty Formatting -> Formatting stimes :: Integral b => b -> Formatting -> Formatting | |
Show Formatting # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> Formatting -> ShowS show :: Formatting -> String showList :: [Formatting] -> ShowS | |
Eq Formatting # | |
Defined in Citeproc.Types |
Constructors
NormalFont | |
ItalicFont | |
ObliqueFont |
data FontVariant #
Constructors
NormalVariant | |
SmallCapsVariant |
Instances
Show FontVariant # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> FontVariant -> ShowS show :: FontVariant -> String showList :: [FontVariant] -> ShowS | |
Eq FontVariant # | |
Defined in Citeproc.Types |
data FontWeight #
Constructors
NormalWeight | |
BoldWeight | |
LightWeight |
Instances
Show FontWeight # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> FontWeight -> ShowS show :: FontWeight -> String showList :: [FontWeight] -> ShowS | |
Eq FontWeight # | |
Defined in Citeproc.Types |
data TextDecoration #
Constructors
NoDecoration | |
UnderlineDecoration |
Instances
Show TextDecoration # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> TextDecoration -> ShowS show :: TextDecoration -> String showList :: [TextDecoration] -> ShowS | |
Eq TextDecoration # | |
Defined in Citeproc.Types Methods (==) :: TextDecoration -> TextDecoration -> Bool (/=) :: TextDecoration -> TextDecoration -> Bool |
data VerticalAlign #
Constructors
BaselineAlign | |
SupAlign | |
SubAlign |
Instances
Show VerticalAlign # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> VerticalAlign -> ShowS show :: VerticalAlign -> String showList :: [VerticalAlign] -> ShowS | |
Eq VerticalAlign # | |
Defined in Citeproc.Types |
data DisplayStyle #
Constructors
DisplayBlock | |
DisplayLeftMargin | |
DisplayRightInline | |
DisplayIndent |
Instances
Show DisplayStyle # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> DisplayStyle -> ShowS show :: DisplayStyle -> String showList :: [DisplayStyle] -> ShowS | |
Eq DisplayStyle # | |
Defined in Citeproc.Types |
Constructors
Lowercase | |
Uppercase | |
CapitalizeFirst | |
CapitalizeAll | |
SentenceCase | |
TitleCase |
data DemoteNonDroppingParticle #
Constructors
DemoteDisplayAndSort | |
DemoteSortOnly | |
DemoteNever |
Instances
Show DemoteNonDroppingParticle # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> DemoteNonDroppingParticle -> ShowS show :: DemoteNonDroppingParticle -> String showList :: [DemoteNonDroppingParticle] -> ShowS | |
Eq DemoteNonDroppingParticle # | |
Defined in Citeproc.Types Methods (==) :: DemoteNonDroppingParticle -> DemoteNonDroppingParticle -> Bool (/=) :: DemoteNonDroppingParticle -> DemoteNonDroppingParticle -> Bool |
data StyleOptions #
Constructors
StyleOptions | |
Fields
|
Instances
Show StyleOptions # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> StyleOptions -> ShowS show :: StyleOptions -> String showList :: [StyleOptions] -> ShowS | |
Eq StyleOptions # | |
Defined in Citeproc.Types |
data SubsequentAuthorSubstitute #
Constructors
SubsequentAuthorSubstitute Text SubsequentAuthorSubstituteRule |
Instances
Show SubsequentAuthorSubstitute # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> SubsequentAuthorSubstitute -> ShowS show :: SubsequentAuthorSubstitute -> String showList :: [SubsequentAuthorSubstitute] -> ShowS | |
Eq SubsequentAuthorSubstitute # | |
Defined in Citeproc.Types Methods (==) :: SubsequentAuthorSubstitute -> SubsequentAuthorSubstitute -> Bool (/=) :: SubsequentAuthorSubstitute -> SubsequentAuthorSubstitute -> Bool |
data SubsequentAuthorSubstituteRule #
Constructors
CompleteAll | |
CompleteEach | |
PartialEach | |
PartialFirst |
Instances
Show SubsequentAuthorSubstituteRule # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> SubsequentAuthorSubstituteRule -> ShowS show :: SubsequentAuthorSubstituteRule -> String showList :: [SubsequentAuthorSubstituteRule] -> ShowS | |
Eq SubsequentAuthorSubstituteRule # | |
Defined in Citeproc.Types Methods (==) :: SubsequentAuthorSubstituteRule -> SubsequentAuthorSubstituteRule -> Bool (/=) :: SubsequentAuthorSubstituteRule -> SubsequentAuthorSubstituteRule -> Bool |
data SecondFieldAlign #
Constructors
SecondFieldAlignFlush | |
SecondFieldAlignMargin |
Instances
Show SecondFieldAlign # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> SecondFieldAlign -> ShowS show :: SecondFieldAlign -> String showList :: [SecondFieldAlign] -> ShowS | |
Eq SecondFieldAlign # | |
Defined in Citeproc.Types Methods (==) :: SecondFieldAlign -> SecondFieldAlign -> Bool (/=) :: SecondFieldAlign -> SecondFieldAlign -> Bool |
data PageRangeFormat #
Constructors
PageRangeChicago15 | |
PageRangeChicago16 | |
PageRangeExpanded | |
PageRangeMinimal | |
PageRangeMinimalTwo |
Instances
Show PageRangeFormat # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> PageRangeFormat -> ShowS show :: PageRangeFormat -> String showList :: [PageRangeFormat] -> ShowS | |
Eq PageRangeFormat # | |
Defined in Citeproc.Types Methods (==) :: PageRangeFormat -> PageRangeFormat -> Bool (/=) :: PageRangeFormat -> PageRangeFormat -> Bool | |
Ord PageRangeFormat # | |
Defined in Citeproc.Types Methods compare :: PageRangeFormat -> PageRangeFormat -> Ordering (<) :: PageRangeFormat -> PageRangeFormat -> Bool (<=) :: PageRangeFormat -> PageRangeFormat -> Bool (>) :: PageRangeFormat -> PageRangeFormat -> Bool (>=) :: PageRangeFormat -> PageRangeFormat -> Bool max :: PageRangeFormat -> PageRangeFormat -> PageRangeFormat min :: PageRangeFormat -> PageRangeFormat -> PageRangeFormat |
Constructors
Style | |
Fields
|
Constructors
LastDigit | |
LastTwoDigits | |
WholeNumber |
data TermGender #
Instances
Show TermGender # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> TermGender -> ShowS show :: TermGender -> String showList :: [TermGender] -> ShowS | |
Eq TermGender # | |
Defined in Citeproc.Types | |
Ord TermGender # | |
Defined in Citeproc.Types Methods compare :: TermGender -> TermGender -> Ordering (<) :: TermGender -> TermGender -> Bool (<=) :: TermGender -> TermGender -> Bool (>) :: TermGender -> TermGender -> Bool (>=) :: TermGender -> TermGender -> Bool max :: TermGender -> TermGender -> TermGender min :: TermGender -> TermGender -> TermGender |
data TermNumber #
Instances
Show TermNumber # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> TermNumber -> ShowS show :: TermNumber -> String showList :: [TermNumber] -> ShowS | |
Eq TermNumber # | |
Defined in Citeproc.Types | |
Ord TermNumber # | |
Defined in Citeproc.Types Methods compare :: TermNumber -> TermNumber -> Ordering (<) :: TermNumber -> TermNumber -> Bool (<=) :: TermNumber -> TermNumber -> Bool (>) :: TermNumber -> TermNumber -> Bool (>=) :: TermNumber -> TermNumber -> Bool max :: TermNumber -> TermNumber -> TermNumber min :: TermNumber -> TermNumber -> TermNumber |
Constructors
Term | |
Fields
|
data SortDirection #
Constructors
Ascending | |
Descending |
Instances
Show SortDirection # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> SortDirection -> ShowS show :: SortDirection -> String showList :: [SortDirection] -> ShowS | |
Eq SortDirection # | |
Defined in Citeproc.Types |
Constructors
SortKeyVariable SortDirection Variable | |
SortKeyMacro SortDirection [Element a] |
data SortKeyValue #
Constructors
SortKeyValue SortDirection (Maybe [Text]) |
Instances
Show SortKeyValue # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> SortKeyValue -> ShowS show :: SortKeyValue -> String showList :: [SortKeyValue] -> ShowS | |
Eq SortKeyValue # | |
Defined in Citeproc.Types |
data LayoutOptions #
Constructors
LayoutOptions | |
Fields
|
Instances
Show LayoutOptions # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> LayoutOptions -> ShowS show :: LayoutOptions -> String showList :: [LayoutOptions] -> ShowS | |
Eq LayoutOptions # | |
Defined in Citeproc.Types |
data Collapsing #
Instances
Show Collapsing # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> Collapsing -> ShowS show :: Collapsing -> String showList :: [Collapsing] -> ShowS | |
Eq Collapsing # | |
Defined in Citeproc.Types |
Constructors
Layout | |
Fields
|
data DisambiguationStrategy #
Constructors
DisambiguationStrategy | |
Fields
|
Instances
Show DisambiguationStrategy # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> DisambiguationStrategy -> ShowS show :: DisambiguationStrategy -> String showList :: [DisambiguationStrategy] -> ShowS | |
Eq DisambiguationStrategy # | |
Defined in Citeproc.Types Methods (==) :: DisambiguationStrategy -> DisambiguationStrategy -> Bool (/=) :: DisambiguationStrategy -> DisambiguationStrategy -> Bool | |
Ord DisambiguationStrategy # | |
Defined in Citeproc.Types Methods compare :: DisambiguationStrategy -> DisambiguationStrategy -> Ordering (<) :: DisambiguationStrategy -> DisambiguationStrategy -> Bool (<=) :: DisambiguationStrategy -> DisambiguationStrategy -> Bool (>) :: DisambiguationStrategy -> DisambiguationStrategy -> Bool (>=) :: DisambiguationStrategy -> DisambiguationStrategy -> Bool max :: DisambiguationStrategy -> DisambiguationStrategy -> DisambiguationStrategy min :: DisambiguationStrategy -> DisambiguationStrategy -> DisambiguationStrategy |
data GivenNameDisambiguationRule #
Instances
Represents a BCP 47 language tag (https://tools.ietf.org/html/bcp47).
Constructors
Lang | |
Fields
|
Instances
IsString Lang | |
Defined in Text.Collate.Lang Methods fromString :: String -> Lang | |
Show Lang | |
Binary Lang | |
Eq Lang | |
Ord Lang | |
Lift Lang | |
renderLang :: Lang -> Text #
Render a Lang
in BCP 47 form.
Defines locale-specific terms, punctuation styles, and date formats.
Constructors
Locale | |
Fields
|
data DisambiguationData #
Constructors
DisambiguationData | |
Fields
|
Instances
Show DisambiguationData # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> DisambiguationData -> ShowS show :: DisambiguationData -> String showList :: [DisambiguationData] -> ShowS | |
Eq DisambiguationData # | |
Defined in Citeproc.Types Methods (==) :: DisambiguationData -> DisambiguationData -> Bool (/=) :: DisambiguationData -> DisambiguationData -> Bool | |
Ord DisambiguationData # | |
Defined in Citeproc.Types Methods compare :: DisambiguationData -> DisambiguationData -> Ordering (<) :: DisambiguationData -> DisambiguationData -> Bool (<=) :: DisambiguationData -> DisambiguationData -> Bool (>) :: DisambiguationData -> DisambiguationData -> Bool (>=) :: DisambiguationData -> DisambiguationData -> Bool max :: DisambiguationData -> DisambiguationData -> DisambiguationData min :: DisambiguationData -> DisambiguationData -> DisambiguationData |
Encodes bibliographic data for a single work.
Constructors
Reference | |
Fields
|
Instances
Foldable Reference # | |
Defined in Citeproc.Types Methods fold :: Monoid m => Reference m -> m foldMap :: Monoid m => (a -> m) -> Reference a -> m foldMap' :: Monoid m => (a -> m) -> Reference a -> m foldr :: (a -> b -> b) -> b -> Reference a -> b foldr' :: (a -> b -> b) -> b -> Reference a -> b foldl :: (b -> a -> b) -> b -> Reference a -> b foldl' :: (b -> a -> b) -> b -> Reference a -> b foldr1 :: (a -> a -> a) -> Reference a -> a foldl1 :: (a -> a -> a) -> Reference a -> a elem :: Eq a => a -> Reference a -> Bool maximum :: Ord a => Reference a -> a minimum :: Ord a => Reference a -> a | |
Traversable Reference # | |
Functor Reference # | |
(Eq a, FromJSON a) => FromJSON (Reference a) # | |
Defined in Citeproc.Types | |
ToJSON a => ToJSON (Reference a) # | |
Defined in Citeproc.Types | |
Show a => Show (Reference a) # | |
Eq a => Eq (Reference a) # | |
Ord a => Ord (Reference a) # | |
newtype ReferenceMap a #
Constructors
ReferenceMap | |
Fields
|
Instances
Show a => Show (ReferenceMap a) # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> ReferenceMap a -> ShowS show :: ReferenceMap a -> String showList :: [ReferenceMap a] -> ShowS |
makeReferenceMap :: [Reference a] -> ([Reference a], ReferenceMap a) #
Returns a pair consisting of the cleaned up list of references and a reference map. If the original reference list contains items with the same id, then the one that occurs last in the list is retained, and the others are omittedfrom the cleaned-up list.
lookupReference :: ItemId -> ReferenceMap a -> Maybe (Reference a) #
Value associated with a certain variable in a bibliographic entry.
Constructors
TextVal Text | Plain text value |
FancyVal a | Formatted value with parameterized type |
NumVal Int | Numerical value |
NamesVal [Name] | Structured names |
DateVal Date | Structured date |
SubstitutedVal | Value suppressed through substitution |
Instances
Foldable Val # | |
Defined in Citeproc.Types Methods fold :: Monoid m => Val m -> m foldMap :: Monoid m => (a -> m) -> Val a -> m foldMap' :: Monoid m => (a -> m) -> Val a -> m foldr :: (a -> b -> b) -> b -> Val a -> b foldr' :: (a -> b -> b) -> b -> Val a -> b foldl :: (b -> a -> b) -> b -> Val a -> b foldl' :: (b -> a -> b) -> b -> Val a -> b foldr1 :: (a -> a -> a) -> Val a -> a foldl1 :: (a -> a -> a) -> Val a -> a elem :: Eq a => a -> Val a -> Bool maximum :: Ord a => Val a -> a | |
Traversable Val # | |
Functor Val # | |
ToJSON a => ToJSON (Val a) # | |
Defined in Citeproc.Types | |
Show a => Show (Val a) # | |
Eq a => Eq (Val a) # | |
Ord a => Ord (Val a) # | |
valToText :: CiteprocOutput a => Val a -> Maybe Text #
Instances
FromJSON Variable # | |
Defined in Citeproc.Types | |
FromJSONKey Variable # | |
Defined in Citeproc.Types Methods | |
ToJSON Variable # | |
Defined in Citeproc.Types | |
ToJSONKey Variable # | |
Defined in Citeproc.Types | |
IsString Variable # | |
Defined in Citeproc.Types Methods fromString :: String -> Variable | |
Monoid Variable # | |
Semigroup Variable # | |
Show Variable # | |
Eq Variable # | |
Ord Variable # | |
toVariable :: Text -> Variable #
fromVariable :: Variable -> Text #
lookupVariable :: CiteprocOutput a => Variable -> Reference a -> Maybe (Val a) #
Constructors
Formatted Formatting [Output a] | |
Linked Text [Output a] | |
InNote (Output a) | |
Literal a | |
Tagged Tag (Output a) | |
NullOutput |
data Identifier #
Constructors
IdentDOI Text | |
IdentPMCID Text | |
IdentPMID Text | |
IdentURL Text |
Instances
Show Identifier # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> Identifier -> ShowS show :: Identifier -> String showList :: [Identifier] -> ShowS | |
Eq Identifier # | |
Defined in Citeproc.Types |
identifierToURL :: Identifier -> Text #
fixShortDOI :: Text -> Text #
Constructors
TagTerm Term | |
TagCitationNumber Int | |
TagCitationLabel | |
TagTitle | marks the title of an entry, so it can be hyperlinked later |
TagItem CitationItemType ItemId | |
TagName Name | |
TagNames Variable NamesFormat [Name] | |
TagDate Date | |
TagYearSuffix Int | |
TagLocator | |
TagPrefix | |
TagSuffix |
outputToText :: CiteprocOutput a => Output a -> Text #
renderOutput :: CiteprocOutput a => CiteprocOptions -> Output a -> a #
formatted :: Formatting -> [Output a] -> Output a #
variableType :: Variable -> VariableType #
data VariableType #
Instances
Show VariableType # | |
Defined in Citeproc.Types Methods showsPrec :: Int -> VariableType -> ShowS show :: VariableType -> String showList :: [VariableType] -> ShowS | |
Eq VariableType # | |
Defined in Citeproc.Types |
data Abbreviations #
An abbreviations map. These are typically stored in a JSON serialization: for examples of the format, see https://github.com/citation-style-language/abbreviations. Abbreviations are substituted in the output when the variable and its content are matched by something in the abbreviations map.
Instances
lookupAbbreviation :: CiteprocOutput a => Variable -> Val a -> Abbreviations -> Maybe (Val a) #
Returns an abbreviation if the variable and its value match something in the abbreviations map.
Result of citation processing.
Constructors
Result | |
Fields
|
Instances
Foldable Result # | |
Defined in Citeproc.Types Methods fold :: Monoid m => Result m -> m foldMap :: Monoid m => (a -> m) -> Result a -> m foldMap' :: Monoid m => (a -> m) -> Result a -> m foldr :: (a -> b -> b) -> b -> Result a -> b foldr' :: (a -> b -> b) -> b -> Result a -> b foldl :: (b -> a -> b) -> b -> Result a -> b foldl' :: (b -> a -> b) -> b -> Result a -> b foldr1 :: (a -> a -> a) -> Result a -> a foldl1 :: (a -> a -> a) -> Result a -> a elem :: Eq a => a -> Result a -> Bool maximum :: Ord a => Result a -> a | |
Traversable Result # | |
Functor Result # | |
FromJSON a => FromJSON (Result a) # | |
Defined in Citeproc.Types | |
ToJSON a => ToJSON (Result a) # | |
Defined in Citeproc.Types | |
Show a => Show (Result a) # | |
Inputs for citation processing.
Constructors
Inputs | |
Fields
|