diff --git a/NEWS.md b/NEWS.md index efe2ab54a..df3eb4120 100644 --- a/NEWS.md +++ b/NEWS.md @@ -6,6 +6,13 @@ - `rjournal_article()` is now soft deprecated in favor of `rjtools::rjournal_pdf_article()` as **rjtools** package is now the recommended workflow at . A warning will be thrown when rticles' function is used. +- `springer_article()` has been updated to new LaTeX templates and CTAN package (thanks, @eliocamp, #494). **we really advice to start new article from scratch by creating new document using lates RMakrdown template**. Among changes: + - New `.tex` templates derived from [https://www.springernature.com](https://www.springernature.com/gp/authors/campaigns/latex-author-support) using `sn-jnl.cls` + - In the format function, `natbib` is now the default citation processing package used (previous it was pandoc citeproc) and `number_sections` is TRUE by default now. Set to `FALSE` for unnumbered headers. + - In the YAML header options, `biblio-style` is now ignored as references styling happens with document class option, so using `classoptions` is now required. `PACS` and `MSC` is also ignored in favor of `pacs.jel` and `pacs.msc`. + - The whole authors and affiliation fields has been rewritten - please see template for new format. + - Pandoc 2.11.4 and above is now required for this format. + ## NEW FEATURES - `ieee_article()` now supports several affiliations per `authors` when using the `wide: true` mode (thanks, @phamdn, #500). diff --git a/R/article.R b/R/article.R index 7e15dc5f6..753d504cb 100644 --- a/R/article.R +++ b/R/article.R @@ -579,12 +579,65 @@ sim_article <- function(..., highlight = NULL, citation_package = "natbib") { #' Macro package for Springer Journals. #' @export #' @rdname article -springer_article <- function(..., keep_tex = TRUE, - citation_package = "default") { - pdf_document_format( +springer_article <- function(..., keep_tex = TRUE, citation_package = "natbib", + number_sections = TRUE, latex_engine = "pdflatex", + pandoc_args = NULL) { + + if (!rmarkdown::pandoc_available("2.11.4")) { + stop("`springer_article()` now requires a minimum of pandoc 2.11.4") + } + + if (citation_package == "biblatex") { + stop("'springer_article' does not support `biblatex` for citation processing. Use 'natbib' instead.") + } + + # to compile with pdflatex/xelatex + # use pdflatex option in the pandoc's template for the document class + if(latex_engine %in% c("pdflatex", "xelatex")) { + pandoc_args <- c(pandoc_args, rmarkdown::pandoc_variable_arg("pdflatex")) + } + + if(!number_sections) { + pandoc_args <- c(pandoc_args, rmarkdown::pandoc_variable_arg("unnumbered")) + } + + format <- pdf_document_format( "springer", - keep_tex = keep_tex, citation_package = citation_package, ... + keep_tex = keep_tex, + citation_package = citation_package, + number_sections = number_sections, + latex_engine = latex_engine, + pandoc_args = pandoc_args, ... ) + + pre_knit_fun <- format$pre_knit + format$pre_knit <- function(input, ...) { + if (is.function(pre_knit_fun)) pre_knit_fun(input, ...) + # for backward compatibility as we changed the template in + # https://github.com/rstudio/rticles/pull/494 + options <- rmarkdown::yaml_front_matter(input) + new_template_msg <- c("If you are rendering an old Rmd, be advise that the template has changed in version '0.25'\n", + " and you should start from a fresh template to get latest resources and new YAML header format.") + if (is.null(options[["classoptions"]])) { + stop("`springer_article()` now requires the 'classoptions' field in YAML front matter. ", + new_template_msg, call. = FALSE) + } + if (!is.null(options[["biblio-style"]])) { + warning("`springer_article()` now ignores the 'biblio-style' field in YAML front matter. ", + "Reference style for 'natbib' is now set using the 'classoptions' field.\n", + new_template_msg) + } + if (!is.null(options[["PACS"]])) { + warning("`springer_article()` now ignores the 'PACS' field in YAML front matter to use `pacs.jel` and `pacs.msc`. ", + new_template_msg) + } + if (!is.null(options[["authors"]][["name"]])) { + stop("`springer_article()` now uses different authors and affiliations fields.\n", + new_template_msg, call. = FALSE) + } + return(invisible(NULL)) + } + format } #' @section `tf_article`: Format for creating submissions to a Taylor & Francis journal. Adapted from diff --git a/inst/rmarkdown/templates/springer/resources/template.tex b/inst/rmarkdown/templates/springer/resources/template.tex index ec7bdb8c4..d028e50fa 100644 --- a/inst/rmarkdown/templates/springer/resources/template.tex +++ b/inst/rmarkdown/templates/springer/resources/template.tex @@ -1,32 +1,61 @@ -% !TeX program = pdfLaTeX -\documentclass[smallextended]{svjour3} % onecolumn (second format) -%\documentclass[twocolumn]{svjour3} % twocolumn +%Version 2.1 April 2023 +% See section 11 of the User Manual for version history % -\smartqed % flush right qed marks, e.g. at end of proof -% -\usepackage{amsmath} -\usepackage{graphicx} -\usepackage[utf8]{inputenc} +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% %% +%% Please do not use \input{...} to include other tex files. %% +%% Submit your LaTeX manuscript as one .tex document. %% +%% %% +%% All additional figures and files should be attached %% +%% separately and not embedded in the \TeX\ document itself. %% +%% %% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +\documentclass[$for(classoptions)$$classoptions$$sep$,$endfor$$if(pdflatex)$,pdflatex$endif$]{sn-jnl} + +%%%% Standard Packages +%% + +\usepackage{graphicx}% +\usepackage{multirow}% +\usepackage{amsmath,amssymb,amsfonts}% +\usepackage{amsthm}% +\usepackage{mathrsfs}% +\usepackage[title]{appendix}% +\usepackage{xcolor}% +\usepackage{textcomp}% +\usepackage{manyfoot}% +\usepackage{booktabs}% +\usepackage{algorithm}% +\usepackage{algorithmicx}% +\usepackage{algpseudocode}% +\usepackage{listings}% +%%%% + +%%%%%=============================================================================%%%% +%%%% Remarks: This template is provided to aid authors with the preparation +%%%% of original research articles intended for submission to journals published +%%%% by Springer Nature. The guidance has been prepared in partnership with +%%%% production teams to conform to Springer Nature technical requirements. +%%%% Editorial and presentation requirements differ among journal portfolios and +%%%% research disciplines. You may find sections in this template are irrelevant +%%%% to your work and are empowered to omit any such section if allowed by the +%%%% journal you intend to submit to. The submission guidelines and policies +%%%% of the journal take precedence. A detailed User Manual is available in the +%%%% template package for technical guidance. +%%%%%=============================================================================%%%% -\usepackage[hyphens]{url} % not crucial - just used below for the URL -\usepackage{hyperref} +$for(header-includes)$ +$header-includes$ +$endfor$ -% -% \usepackage{mathptmx} % use Times fonts if available on your TeX system -% -% insert here the call for the packages your document requires -%\usepackage{latexsym} -% etc. -% -% please place your own definitions here and don't use \def but -% \newcommand{}{} -% -% Insert the name of "your journal" with -% \journalname{myjournal} -% -%% load any required packages here -$preamble$ +\raggedbottom + +$if(unnumbered)$ +\unnumbered +$endif$ + $if(highlighting-macros)$ % Pandoc syntax highlighting @@ -87,9 +116,8 @@ \newcommand{\CSLIndent}[1]{\hspace{\cslhangindent}#1} $endif$ -$for(header-includes)$ -$header-includes$ -$endfor$ + + \begin{document} $for(include-before)$ @@ -97,71 +125,56 @@ $endfor$ -\title{$title$ $if(thanks)$\thanks{$thanks$} $endif$} -$if(subtitle)$ \subtitle{$subtitle$} $endif$ - -$if(titlerunning)$ - \titlerunning{$titlerunning$} -$endif$ - -\author{ $for(authors)$ $authors.name$ \and $endfor$ } +\title[$if(titlerunning)$$titlerunning$$endif$]{$title$} + +%%=============================================================%% +%% Prefix -> \pfx{Dr} +%% GivenName -> \fnm{Joergen W.} +%% Particle -> \spfx{van der} -> surname prefix +%% FamilyName -> \sur{Ploeg} +%% Suffix -> \sfx{IV} +%% NatureName -> \tanm{Poet Laureate} -> Title after name +%% Degrees -> \dgr{MSc, PhD} +%% \author*[1,2]{\pfx{Dr} \fnm{Joergen W.} \spfx{van der} \sur{Ploeg} \sfx{IV} \tanm{Poet Laureate} +%% \dgr{MSc, PhD}}\email{iauthor@gmail.com} +%%=============================================================%% + +$for(authors)$ +\author$if(authors.corresponding)$*$endif$[$for(authors.affiliation)$$authors.affiliation$$sep$,$endfor$]{$if(authors.prefix)$\pfx{$authors.prefix$} $endif$$if(authors.firstname)$\fnm{$authors.firstname$} $endif$$if(authors.particle)$\spfx{$authors.particle$} $endif$$if(authors.lastname)$\sur{$authors.lastname$} $endif$$if(authors.suffix)$\sfx{$authors.suffix$} $endif$$if(authors.naturename)$\tanm{$authors.naturename$} $endif$$if(authors.degrees)$\dgr{$authors.degrees$}$endif$}$if(authors.email)$\email{$authors.email$}$endif$ +$if(authors.equal_contribution)$\equalcont{authors.equal_contribution}$endif$ +$endfor$ -$if(authorrunning)$ - \authorrunning{ $authorrunning$ } -$endif$ -\institute{ - $for(authors)$ - $authors.name$ \at - $if(authors.address)$ $authors.address$ $endif$\\ - $if(authors.email)$ \email{$authors.email$} $endif$ % \\ -% \emph{Present address:} of F. Author % if needed - \and - $endfor$ -} +$for(affiliations)$ + \affil$if(affiliations.corresponding)$*$endif$[$affiliations.number$]{$for(affiliations.info/pairs)$\$it.key${$it.value$}$sep$, $endfor$$if(affiliations.address)$, \orgaddress{$for(affiliations.address/pairs)$\$it.key${$it.value$}$sep$, $endfor$}$endif$} +$endfor$ -\date{Received: date / Accepted: date} -% The correct dates will be entered by the editor +\abstract{$abstract$} +\keywords{$for(keywords)$$keywords$$sep$, $endfor$} -\maketitle -\begin{abstract} -$abstract$ -\\ -\keywords{ - $for(keywords)$ - $keywords$ \and - $endfor$ -} -$if(PACS)$ - \PACS{ - $for(PACS)$ - $PACS$ \and - $endfor$ - } +$if(pacs)$ +$if(pacs.jel)$ +\pacs[JEL Classification]{$for(pacs.jel)$$pacs.jel$$sep$, $endfor$} +$endif$ +$if(pacs.msc)$ +\pacs[MSC Classification]{$for(pacs.msc)$$pacs.msc$$sep$, $endfor$} $endif$ - -$if(MSC)$ - \subclass{ - $for(MSC)$ - $MSC$ \and - $endfor$ - } $endif$ -\end{abstract} - - -\def\spacingset#1{\renewcommand{\baselinestretch}% -{#1}\small\normalsize} \spacingset{1} - +\maketitle $body$ - -\bibliographystyle{$if(biblio-style)$$biblio-style$$else$$if(bibstyle)$$bibstyle$$else$spbasic$endif$$endif$} +$if(natbib)$ +$if(bibliography)$ +$if(biblio-title)$ +\renewcommand\refname{$biblio-title$} +$endif$ \bibliography{$for(bibliography)$$bibliography$$sep$,$endfor$} +$endif$ +$endif$ $for(include-after)$ $include-after$ diff --git a/inst/rmarkdown/templates/springer/skeleton/bibliography.bib b/inst/rmarkdown/templates/springer/skeleton/bibliography.bib index 7ed446965..8361ae821 100644 --- a/inst/rmarkdown/templates/springer/skeleton/bibliography.bib +++ b/inst/rmarkdown/templates/springer/skeleton/bibliography.bib @@ -1,26 +1,24 @@ -%% Copied from asa_article template - +%% Journal article +@article{bib1, + author = "Campbell, S. L. and Gear, C. W.", + title = "The index of general nonlinear {D}{A}{E}{S}", + journal = "Numer. {M}ath.", + volume = "72", + number = "2", + pages = "173--196", + year = "1995" +} -@incollection{Galyardt14mmm, - Author = {April Galyardt}, - Booktitle = {Handbook of Mixed Membership Models}, - Date-Added = {2014-08-21 21:18:27 +0000}, - Date-Modified = {2014-08-21 21:18:27 +0000}, - Editor = {Edoardo M. Airoldi and David Blei and Erosheva, Elena and Fienberg, Stephen E.}, - Publisher = {Chapman and Hall}, - Title = {Interpreting Mixed Membership Models: Implications of Erosheva's Representation Theorem}, - Year = {2014} +%% Journal article with DOI +@article{bib2, + author = "Slifka, M. K. and Whitton, J. L.", + title = "Clinical implications of dysregulated cytokine production", + journal = "J. {M}ol. {M}ed.", + volume = "78", + pages = "74--80", + year = "2000", + doi = "10.1007/s001090000086" } -@incollection{Mislevy06Cog, - Author = {Robert Mislevy}, - Booktitle = {Educational Assessment}, - Chapter = {8}, - Date-Added = {2014-08-21 20:58:59 +0000}, - Date-Modified = {2014-08-21 20:58:59 +0000}, - Editor = {Robert L. Brennan}, - Publisher = {American Council on Education and Praeger Publishers}, - Title = {Cognitive Psychology and Educational Assessment}, - Year = {2006} -} + diff --git a/inst/rmarkdown/templates/springer/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/springer/skeleton/skeleton.Rmd index f51c68121..1caf03090 100644 --- a/inst/rmarkdown/templates/springer/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/springer/skeleton/skeleton.Rmd @@ -1,63 +1,546 @@ --- -title: Title here -subtitle: Do you have a subtitle? If so, write it here -titlerunning: Short form of title (if too long for head) -authorrunning: Short form of author list if too long for running head -thanks: | - Grants or other notes about the article that should go on the front - page should be placed here. General acknowledgments should be placed at the - end of the article. +# Supported options: +# sn-nature: Style for submissions to Nature Portfolio journals +# sn-basic: Basic Springer Nature Reference Style/Chemistry Reference Style +# sn-mathphys: Math and Physical Sciences Reference Style +# sn-aps: American Physical Society (APS) Reference Style +# sn-vancouver: Vancouver Reference Style +# sn-apa: APA Reference Style +# sn-chicago: Chicago-based Humanities Reference Style +# default: Default + +classoptions: + - sn-basic + # - Numbered # Optional: Use numbered references instead of namedate references (only for sn-nature, sn-basic, sn-vancouver, sn-chicago, sn-mathphys or sn-nature) + # - referee # Optional: Use double line spacing + # - lineno # Optional: Add line numbers + # - iicol # Optional: Double column layour + +title: Article Title +titlerunning: Article Title runing authors: -- name: Äüthör 1 - address: Department of YYY, University of XXX - email: abc@def - -- name: Âuthóř 2 - address: Department of ZZZ, University of WWW - email: djf@wef + - prefix: Dr. + firstname: Leading + particle: van + lastname: Author + suffix: III + naturename: Poet Laureate + degrees: MSc, PhD + email: abc@def + affiliation: [1,2] + corresponding: TRUE + equalcont: These authors contributed equally to this work. + + - firstname: Second + lastname: Author + affiliation: 2 + equalcont: These authors contributed equally to this work. -keywords: -- key -- dictionary -- word -#PACS: -#- PAC1 -#- superPAC +affiliations: + - number: 1 + corresponding: TRUE + info: + orgdiv: Department + orgname: Organization + address: + street: Street + city: City + postcode: 100190 + state: State + country: Country + - number: 2 + corresponding: TRUE + info: + orgname: Other Organisation -MSC: -- MSC code 1 -- MSC code 2 + +keywords: + - key + - dictionary + - word + +pacs: + jel: + - "D8" + - "H51" + msc: + - "35A01" + - "65L10" +# Sample for unstructured abstract +# abstract: | +# The abstract serves both as a general introduction to the topic and as a brief, non-technical summary of the main results and their implications. Authors are advised to check the author instructions for the journal they are submitting to for word limits and if structural elements like subheadings, citations, or equations are permitted. + +# Sample for structured abstract abstract: | - The text of your abstract. 150 -- 250 words. + **Purpose**: The abstract serves both as a general introduction to the topic and as a brief, non-technical summary of the main results and their implications. The abstract must not include subheadings (unless expressly permitted in the journal's Instructions to Authors), equations or citations. As a guide the abstract should not exceed 200 words. Most journals do not set a hard limit however authors are advised to check the author instructions for the journal they are submitting to. + + **Methods:** The abstract serves both as a general introduction to the topic and as a brief, non-technical summary of the main results and their implications. The abstract must not include subheadings (unless expressly permitted in the journal's Instructions to Authors), equations or citations. As a guide the abstract should not exceed 200 words. Most journals do not set a hard limit however authors are advised to check the author instructions for the journal they are submitting to. + + **Results:** The abstract serves both as a general introduction to the topic and as a brief, non-technical summary of the main results and their implications. The abstract must not include subheadings (unless expressly permitted in the journal's Instructions to Authors), equations or citations. As a guide the abstract should not exceed 200 words. Most journals do not set a hard limit however authors are advised to check the author instructions for the journal they are submitting to. + + **Conclusion:** The abstract serves both as a general introduction to the topic and as a brief, non-technical summary of the main results and their implications. The abstract must not include subheadings (unless expressly permitted in the journal's Instructions to Authors), equations or citations. As a guide the abstract should not exceed 200 words. Most journals do not set a hard limit however authors are advised to check the author instructions for the journal they are submitting to.} bibliography: bibliography.bib -biblio-style: spphys -# bibstyle options spbasic(default), spphys, spmpsci + +header-includes: | + %% Per the spinger doc, new theorem styles can be included using built in style, + %% but it seems the don't work so commented below + %\theoremstyle{thmstyleone}% + \newtheorem{theorem}{Theorem}% meant for continuous numbers + %%\newtheorem{theorem}{Theorem}[section]% meant for sectionwise numbers + %% optional argument [theorem] produces theorem numbering sequence instead of independent numbers for Proposition + \newtheorem{proposition}[theorem]{Proposition}% + %%\newtheorem{proposition}{Proposition}% to get separate numbers for theorem and proposition etc. + + %% \theoremstyle{thmstyletwo}% + \theoremstyle{remark} + \newtheorem{example}{Example}% + \newtheorem{remark}{Remark}% + + %% \theoremstyle{thmstylethree}% + \theoremstyle{definition} + \newtheorem{definition}{Definition}% + output: rticles::springer_article --- -# Introduction {#intro} +```{r setup, include=FALSE} +knitr::opts_chunk$set(echo = FALSE, + out.extra = "") # This forces knitr to label all figures. +``` + +# Introduction {#sec1} + +The Introduction section, of referenced text @bib1 expands on the background of the work (some overlap with the Abstract is acceptable). The introduction should not include subheadings. + +Springer Nature does not impose a strict layout as standard however authors are advised to check the individual requirements for the journal they are planning to submit to as there may be journal-level preferences. +When preparing your text please also be aware that some stylistic choices are not supported in full text XML (publication version), including coloured font. +These will not be replicated in the typeset article if it is accepted. + +# Results {#sec2} + +Sample body text. +Sample body text. +Sample body text. +Sample body text. +Sample body text. +Sample body text. +Sample body text. +Sample body text. + +# This is an example for first level head---section head {#sec3} -Your text comes here. Separate text sections with \cite{Mislevy06Cog}. +## This is an example for second level head---subsection head {#subsec2} -# Section title {#sec:1} +### This is an example for third level head---subsubsection head {#subsubsec2} -Text with citations by \cite{Galyardt14mmm}. +Sample body text. +Sample body text. +Sample body text. +Sample body text. +Sample body text. +Sample body text. +Sample body text. -## Subsection title {#sec:2} +# Equations {#sec4} -as required. Don't forget to give each section -and subsection a unique label (see Sect. \ref{sec:1}). +Equations in \LaTeX\ can either be inline or on-a-line by itself ("display equations"). For +inline equations use the `$...$` commands. E.g.: The equation +$H\psi = E \psi$ is written via the command `$H \psi = E \psi$`. -#### Paragraph headings +For display equations (with auto generated equation numbers) +one can use the equation or align environments: -Use paragraph headings as needed. +\begin{equation} +\|\tilde{X}(k)\|^2 \leq\frac{\sum\limits_{i=1}^{p}\left\|\tilde{Y}_i(k)\right\|^2+\sum\limits_{j=1}^{q}\left\|\tilde{Z}_j(k)\right\|^2 }{p+q}.\label{eq1} +\end{equation} + +where, \begin{align} -a^2+b^2=c^2 +D_\mu &= \partial_\mu - ig \frac{\lambda^a}{2} A^a_\mu \nonumber \\ +F^a_{\mu\nu} &= \partial_\mu A^a_\nu - \partial_\nu A^a_\mu + g f^{abc} A^b_\mu A^a_\nu \label{eq2} \end{align} +Notice the use of `\nonumber` in the align environment at the end +of each line, except the last, so as not to produce equation numbers on +lines where no equation numbers are required. The `\label{}` command +should only be used at the last line of an align environment where +`\nonumber` is not used. + +\begin{equation} +Y_\infty = \left( \frac{m}{\textrm{GeV}} \right)^{-3} + \left[ 1 + \frac{3 \ln(m/\textrm{GeV})}{15} + + \frac{\ln(c_2/5)}{15} \right] +\end{equation} + +The class file also supports the use of `\mathbb{}`, `\mathscr{}` and +`\mathcal{}` commands. As such `\mathbb{R}`, `\mathscr{R}` +and `\mathcal{R}` produces $\mathbb{R}$, $\mathscr{R}$ and $\mathcal{R}$ +respectively (refer Subsubsection\ \ref{subsubsec2}). + +# Tables {#sec5} + +Tables can be inserted via the normal `knitr::kable()` function or other table-generating packages. + +```{r tab1} +knitr::kable(head(pressure), + format = "latex", + caption = "Caption text") +``` + +Tables can also be inserted via the normal table and tabular environment. To put +footnotes inside tables you should use `\footnotetext[]{...}` tag. +The footnote appears just below the table itself (refer Tables~\ref{tab1} and \ref{tab2}). +For the corresponding footnotemark use `\footnotemark[...]` + +\begin{table}[h] +\caption{Caption text}\label{tab1}% +\begin{tabular}{@{}llll@{}} +\toprule +Column 1 & Column 2 & Column 3 & Column 4\\ +\midrule +row 1 & data 1 & data 2 & data 3 \\ +row 2 & data 4 & data 5\footnotemark[1] & data 6 \\ +row 3 & data 7 & data 8 & data 9\footnotemark[2] \\ +\botrule +\end{tabular} +\footnotetext{Source: This is an example of table footnote. This is an example of table footnote.} +\footnotetext[1]{Example for a first table footnote. This is an example of table footnote.} +\footnotetext[2]{Example for a second table footnote. This is an example of table footnote.} +\end{table} + +\noindent +The input format for the above table is as follows: + + +``` +\begin{table}[] +\caption{}\label{}% +\begin{tabular}{@{}llll@{}} +\toprule +Column 1 & Column 2 & Column 3 & Column 4\\ +\midrule +row 1 & data 1 & data 2 & data 3 \\ +row 2 & data 4 & data 5\footnotemark[1] & data 6 \\ +row 3 & data 7 & data 8 & data 9\footnotemark[2]\\ +\botrule +\end{tabular} +\footnotetext{Source: This is an example of table footnote. +This is an example of table footnote.} +\footnotetext[1]{Example for a first table footnote. +This is an example of table footnote.} +\footnotetext[2]{Example for a second table footnote. +This is an example of table footnote.} +\end{table} +``` + +\begin{table}[h] +\caption{Example of a lengthy table which is set to full textwidth}\label{tab2} +\begin{tabular*}{\textwidth}{@{\extracolsep\fill}lcccccc} +\toprule% +& \multicolumn{3}{@{}c@{}}{Element 1\footnotemark[1]} & \multicolumn{3}{@{}c@{}}{Element 2\footnotemark[2]} \\\cmidrule{2-4}\cmidrule{5-7}% +Project & Energy & $\sigma_{calc}$ & $\sigma_{expt}$ & Energy & $\sigma_{calc}$ & $\sigma_{expt}$ \\ +\midrule +Element 3 & 990 A & 1168 & $1547\pm12$ & 780 A & 1166 & $1239\pm100$\\ +Element 4 & 500 A & 961 & $922\pm10$ & 900 A & 1268 & $1092\pm40$\\ +\botrule +\end{tabular*} +\footnotetext{Note: This is an example of table footnote. This is an example of table footnote this is an example of table footnote this is an example of~table footnote this is an example of table footnote.} +\footnotetext[1]{Example for a first table footnote.} +\footnotetext[2]{Example for a second table footnote.} +\end{table} + +\vfill\eject + +In case of double column layout, tables which do not fit in single column width should be set to full text width. +For this, you need to use `\begin{table*}` `...` `\end{table*}` instead of `\begin{table}` `...` `\end{table}` environment. Lengthy tables which do not fit in textwidth should be set as rotated table. For this, you need to use `\begin{sidewaystable}` `...` `\end{sidewaystable}` instead of `\begin{table*}` `...` `\end{table*}` environment. This environment puts tables rotated to single column width. For tables rotated to double column width, use `\begin{sidewaystable*}` `...` `\end{sidewaystable*}`. + +\begin{sidewaystable} +\caption{Tables which are too long to fit, should be written using the "sidewaystable" environment as shown here}\label{tab3} +\begin{tabular*}{\textheight}{@{\extracolsep\fill}lcccccc} +\toprule% +& \multicolumn{3}{@{}c@{}}{Element 1\footnotemark[1]}& \multicolumn{3}{@{}c@{}}{Element\footnotemark[2]} \\\cmidrule{2-4}\cmidrule{5-7}% +Projectile & Energy & $\sigma_{calc}$ & $\sigma_{expt}$ & Energy & $\sigma_{calc}$ & $\sigma_{expt}$ \\ +\midrule +Element 3 & 990 A & 1168 & $1547\pm12$ & 780 A & 1166 & $1239\pm100$ \\ +Element 4 & 500 A & 961 & $922\pm10$ & 900 A & 1268 & $1092\pm40$ \\ +Element 5 & 990 A & 1168 & $1547\pm12$ & 780 A & 1166 & $1239\pm100$ \\ +Element 6 & 500 A & 961 & $922\pm10$ & 900 A & 1268 & $1092\pm40$ \\ +\botrule +\end{tabular*} +\footnotetext{Note: This is an example of table footnote this is an example of table footnote this is an example of table footnote this is an example of~table footnote this is an example of table footnote.} +\footnotetext[1]{This is an example of table footnote.} +\end{sidewaystable} + +# Figures {#sec6} + +As per the \LaTeX\ standards you need to use eps images for \LaTeX\ compilation and `pdf/jpg/png` images for `PDFLaTeX` compilation. +Use the `dev` knitr option to use the approrpate format. +This is one of the major difference between \LaTeX\ and `PDFLaTeX`. +Each image should be from a single input .eps/vector image file. +Avoid using subfigures. +The command for inserting images for \LaTeX\ and `PDFLaTeX` can be generalized. +The package used to insert images in `LaTeX/PDFLaTeX` is the graphicx package. +Figures can be inserted via the normal figure environment as shown in the below example: + +```{r fig1, fig.cap = "This is an example of a caption", fig.width = 5} +plot(pressure) +``` + +# Algorithms, Program codes and Listings {#sec7} + +Packages `algorithm`, `algorithmicx` and `algpseudocode` are used for setting algorithms in \LaTeX\ using the format: + +``` +\begin{algorithm} +\caption{}\label{} +\begin{algorithmic}[1] +. . . +\end{algorithmic} +\end{algorithm} +``` + +You may refer above listed package documentations for more details before setting `algorithm` environment. For program codes, the "program" package is required and the command to be used is `\begin{program}` `...` `\end{program}`. A fast exponentiation procedure: + +Similarly, for `listings`, use the `listings` package. `\begin{lstlisting}` `...` `\end{lstlisting}` is used to set environments similar to `verbatim` environment. Refer to the `lstlisting` package documentation for more details. + +A fast exponentiation procedure: + +```{=latex} +\lstset{texcl=true,basicstyle=\small\sf,commentstyle=\small\rm,mathescape=true,escapeinside={(*}{*)}} +\begin{lstlisting} +begin + for $i:=1$ to $10$ step $1$ do + expt($2,i$); + newline() od (*\textrm{Comments will be set flush to the right margin}*) +where +proc expt($x,n$) $\equiv$ + $z:=1$; + do if $n=0$ then exit fi; + do if odd($n$) then exit fi; + comment: (*\textrm{This is a comment statement;}*) + $n:=n/2$; $x:=x*x$ od; + { $n>0$ }; + $n:=n-1$; $z:=z*x$ od; + print($z$). +end +\end{lstlisting} +``` + +```{=latex} +\begin{algorithm} +\caption{Calculate $y = x^n$}\label{algo1} +\begin{algorithmic}[1] +\Require $n \geq 0 \vee x \neq 0$ +\Ensure $y = x^n$ +\State $y \Leftarrow 1$ +\If{$n < 0$}\label{algln2} + \State $X \Leftarrow 1 / x$ + \State $N \Leftarrow -n$ +\Else + \State $X \Leftarrow x$ + \State $N \Leftarrow n$ +\EndIf +\While{$N \neq 0$} + \If{$N$ is even} + \State $X \Leftarrow X \times X$ + \State $N \Leftarrow N / 2$ + \Else[$N$ is odd] + \State $y \Leftarrow y \times X$ + \State $N \Leftarrow N - 1$ + \EndIf +\EndWhile +\end{algorithmic} +\end{algorithm} +``` + +:::: {.minipage latex="{\hsize}"} +\lstset{frame=single,framexleftmargin=-1pt,framexrightmargin=-17pt,framesep=12pt,linewidth=0.98\textwidth,language=pascal} + + +::: {.lstlisting latex=true} +for i:=maxint to 0 do +begin +{ do nothing } +end; +Write('Case insensitive '); +Write('Pascal keywords.'); +::: +:::: + +# Cross referencing {#sec8} + +Figures and tables are labeled with a prefix (fig or tab, respectively) plus the chunk label. +Other environments such as equation and align can be labelled via the `\label{#label}` command inside or just below the `\caption{}` command. +You can then use the label for cross-reference. As an example, consider +the chunk label declared for Figure\ \ref{fig:fig1} which is +fig1. +To cross-reference it, use the command +`Figure \ref{fig:fig1}`, for which it comes up as +"Figure\ \ref{fig:fig1}". + +To reference line numbers in an algorithm, consider the label declared for the line number 2 of Algorithm\ \ref{algo1} is `\label{algln2}`. To cross-reference it, use the command `\ref{algln2}` for which it comes up as line\ \ref{algln2} of Algorithm\ \ref{algo1}. + +## Details on reference citations {#subsec7} + +For citations of references, use\ @bib1 or [@bib2]. + +# Examples for theorem like environments {#sec10} + +The documentclass for springer `sn-jnl.cls` contains 3 styling that you can use to set new default for theorems and proofs type + +`thmstyleone` + +: Numbered, theorem head in bold font and theorem text in italic style + +`thmstyletwo` + +: Numbered, theorem head in roman font and theorem text in italic style + +`thmstylethree` + +: Numbered, theorem head in bold font and theorem text in roman style + +For mathematics journals, theorem styles can be included as shown in the following examples. + +::: {.theorem latex=true} +Example theorem text. Example theorem text. Example theorem text. Example theorem text. Example theorem text. +Example theorem text. Example theorem text. Example theorem text. Example theorem text. Example theorem text. +Example theorem text. +::: + +To add labels and subheadings, use LaTeX notation + +::: {.theorem latex="[Theorem subhead]\label{thm1}"} +Example theorem text. Example theorem text. Example theorem text. Example theorem text. Example theorem text. +Example theorem text. Example theorem text. Example theorem text. Example theorem text. Example theorem text. +Example theorem text. +::: + +Other environments are proposition, example, remark, definition, proof and quote + +Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. + +::: {.proposition latex=true} +Example proposition text. Example proposition text. Example proposition text. Example proposition text. Example proposition text. +Example proposition text. Example proposition text. Example proposition text. Example proposition text. Example proposition text. +::: + +Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. + +::: {.example latex=true} +Phasellus adipiscing semper elit. Proin fermentum massa +ac quam. Sed diam turpis, molestie vitae, placerat a, molestie nec, leo. Maecenas lacinia. Nam ipsum ligula, eleifend +at, accumsan nec, suscipit a, ipsum. Morbi blandit ligula feugiat magna. Nunc eleifend consequat lorem. +::: + +Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. + +::: {.remark latex=true} +Phasellus adipiscing semper elit. Proin fermentum massa +ac quam. Sed diam turpis, molestie vitae, placerat a, molestie nec, leo. Maecenas lacinia. Nam ipsum ligula, eleifend +at, accumsan nec, suscipit a, ipsum. Morbi blandit ligula feugiat magna. Nunc eleifend consequat lorem. +::: + +Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. + +::: {.definition latex="[Definition sub head]"} +Example definition text. Example definition text. Example definition text. Example definition text. Example definition text. Example definition text. Example definition text. Example definition text. +::: + +Additionally a predefined "proof" environment is available. This prints a "Proof" head in italic font style and the "body text" in roman font style with an open square at the end of each proof environment. + +::: {.proof latex=true} +Example for proof text. Example for proof text. Example for proof text. Example for proof text. Example for proof text. Example for proof text. Example for proof text. Example for proof text. Example for proof text. Example for proof text. +::: + +Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. Sample body text. + +# Methods {#sec11} + +Topical subheadings are allowed. Authors must ensure that their Methods section includes adequate experimental and characterization data necessary for others in the field to reproduce their work. Authors are encouraged to include RIIDs where appropriate. + +**Ethical approval declarations** (only required where applicable) Any article reporting experiment/s carried out on (i)~live vertebrate (or higher invertebrates), (ii)~humans or (iii)~human samples must include an unambiguous statement within the methods section that meets the following requirements: + +1. Approval: a statement which confirms that all experimental protocols were approved by a named institutional and/or licensing committee. Please identify the approving body in the methods section + +2. Accordance: a statement explicitly saying that the methods were carried out in accordance with the relevant guidelines and regulations + +3. Informed consent (for experiments involving humans or human tissue samples): include a statement confirming that informed consent was obtained from all participants and/or their legal guardian/s + + +If your manuscript includes potentially identifying patient/participant information, or if it describes human transplantation research, or if it reports results of a clinical trial then additional information will be required. Please visit () for Nature Portfolio journals, () for Springer Nature journals, or () for BMC. + +# Discussion {#sec12} + +Discussions should be brief and focused. In some disciplines use of Discussion or 'Conclusion' is interchangeable. It is not mandatory to use both. Some journals prefer a section 'Results and Discussion' followed by a section 'Conclusion'. Please refer to Journal-level guidance for any specific requirements. + +# Conclusion {#sec13} + +Conclusions may be used to restate your hypothesis or research question, restate your major findings, explain the relevance and the added value of your work, highlight any limitations of your study, describe future directions for research and recommendations. + +In some disciplines use of Discussion or 'Conclusion' is interchangeable. It is not mandatory to use both. Please refer to Journal-level guidance for any specific requirements. + +\backmatter + +\bmhead{Supplementary information} + +If your article has accompanying supplementary file/s please state so here. + +Authors reporting data from electrophoretic gels and blots should supply the full unprocessed scans for key as part of their Supplementary information. This may be requested by the editorial team/s if it is missing. + +Please refer to Journal-level guidance for any specific requirements. + +\bmhead{Acknowledgments} + +Acknowledgments are not compulsory. Where included they should be brief. Grant or contribution numbers may be acknowledged. + +Please refer to Journal-level guidance for any specific requirements. + +# Declarations {.unnumbered} + +Some journals require declarations to be submitted in a standardised format. Please check the Instructions for Authors of the journal to which you are submitting to see if you need to complete this section. If yes, your manuscript must contain the following sections under the heading `Declarations': + +* Funding +* Conflict of interest/Competing interests (check journal-specific guidelines for which heading to use) +* Ethics approval +* Consent to participate +* Consent for publication +* Availability of data and materials +* Code availability +* Authors' contributions + +\noindent +If any of the sections are not relevant to your manuscript, please include the heading and write `Not applicable' for that section. + + +::: {.flushleft latex=true} +Editorial Policies for: + +\noindent +Springer journals and proceedings: + +\noindent +Nature Portfolio journals: + +\noindent +\textit{Scientific Reports}: + +\noindent +BMC journals: +::: + + +::: {.appendices latex=true} + +# Section title of first appendix {#secA1} + +An appendix contains supplementary information that is not an essential part of the text itself but which may be helpful in providing a more comprehensive understanding of the research problem or it is information that is too cumbersome to be included in the body of the paper. + +For submissions to Nature Portfolio Journals please use the heading "Extended Data". +::: diff --git a/inst/rmarkdown/templates/springer/skeleton/sn-apacite.bst b/inst/rmarkdown/templates/springer/skeleton/sn-apacite.bst new file mode 100644 index 000000000..be1dc5309 --- /dev/null +++ b/inst/rmarkdown/templates/springer/skeleton/sn-apacite.bst @@ -0,0 +1,5364 @@ +%% +%% This is file `apacite.bst', +%% generated with the docstrip utility. +%% +%% The original source files were: +%% +%% apacite.dtx (with options: `bibstyle') +%% +%% This is a generated file. +%% +%% Copyright (C) 1994-2013 Erik Meijer and any individual authors listed +%% elsewhere in this file. +%% +%% This file is part of the `apacite' package. +%% ------------------------------------------- +%% +%% It may be distributed and/or modified under the +%% conditions of the LaTeX Project Public License, either +%% version 1.3 of this license or (at your option) any later +%% version. The latest version of this license is in: +%% +%% http://www.latex-project.org/lppl.txt +%% +%% and version 1.3 or later is part of all distributions of +%% LaTeX version 2005/12/01 or later. +%% +%% The `apacite' package consists of the files apacite.dtx and +%% apacite.ins, and the following generated files: +%% apacite.sty, apacdoc.sty, apacite.drv, +%% apacite.bst, apacitex.bst, apacann.bst, apacannx.bst, +%% apa5ex.bib, apacxmpl.tex, +%% english.apc, dutch.apc, finnish.apc, french.apc, +%% german.apc, ngerman.apc, greek.apc, norsk.apc, +%% spanish.apc, swedish.apc. +%% +%% This work has the LPPL maintenance status `maintained' +%% +%% The Current Maintainer of this work is Erik Meijer +%% +%% This file may only be distributed together with a copy of the +%% source files of the apacite package, i.e., apacite.dtx and +%% apacite.ins. You may however distribute the apacite package without +%% the generated files. +%% +%% apacite.bst +%% [2013/07/21 v6.03 APA bibliography style] +%% apacite.bst : reference list according to APA manual +%% Written by Erik Meijer + +FUNCTION {identify.apacite.version} +{ % Put identifying string in the .blg file + "apacite.bst" + " [2013/07/21 v6.03 APA bibliography style]" + * top$ +} +ENTRY + { address + annote + annotate + author + booktitle + chair + chapter + day + doi + edition + editor + englishtitle + firstkey + howpublished + institution + journal + key + keywords + lastchecked + month + nihms + note + number + organization + originaladdress + originalbooktitle + originaledition + originaleditor + originaljournal + originalnumber + originalpages + originalpublisher + originalvolume + originalyear + pages + pmcid + publisher + school + series + symposium + text + title + translator + type + url + urldate + volume + year + eprint + archive + archivePrefix + primaryClass + eid + adsurl + adsnote + version + } + { cite.order %% order of first citation + title.number %% for sorting titles + cite.initials %% dummy (0-1) indicating whether or not + %% initials of the 1st author must + %% be used for citing + cite.num.names.full %% number of names to be cited for full and + cite.num.names.short %% short cite + add.to.year %% For a, b, c, etc. after year + %% in multiple citations with same author-year + } + { year.label %% For sorting entries by year + author.year.sort.label %% For sorting entries and checking whether + %% initials should be added, how many authors + %% should be cited and whether a, b, etc. + %% after year is necessary + title.sort.label %% for sorting titles + citeorder.sort.label %% for sorting by citation order + type.2 %% Replacement for type with misc entries and + %% entries that revert to misc. + } +INTEGERS { len pos name.max old.number numnames numnames.old + nameptr lastname format.num.names cite.initials.old + cite.num.names.old add.to.year.old forward + multiresult dot brace.level + } + +STRINGS { s t u old.label field + aut1f aut1s aut1f.old aut1s.old + aut2 aut2.old + aut3 aut3.old + aut4 aut4.old + aut5 aut5.old + aut6 aut6.old + year.label.old + } +FUNCTION {test} { #0 } +FUNCTION {dump.stack} +{ "---- STACK {" cite$ * "} ----" * top$ + stack$ + "---- END STACK {" cite$ * "} ----" * top$ +} +FUNCTION {make.index} { #0 } +FUNCTION {unsorted} { #0 } +MACRO {jan} {"{\APACmonth{01}}"} +MACRO {feb} {"{\APACmonth{02}}"} +MACRO {mar} {"{\APACmonth{03}}"} +MACRO {apr} {"{\APACmonth{04}}"} +MACRO {may} {"{\APACmonth{05}}"} +MACRO {jun} {"{\APACmonth{06}}"} +MACRO {jul} {"{\APACmonth{07}}"} +MACRO {aug} {"{\APACmonth{08}}"} +MACRO {sep} {"{\APACmonth{09}}"} +MACRO {oct} {"{\APACmonth{10}}"} +MACRO {nov} {"{\APACmonth{11}}"} +MACRO {dec} {"{\APACmonth{12}}"} +MACRO {winter} {"{\APACmonth{13}}"} +MACRO {spring} {"{\APACmonth{14}}"} +MACRO {summer} {"{\APACmonth{15}}"} +MACRO {fall} {"{\APACmonth{16}}"} +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % issues warning if field is empty + % call with + % "field" field warning.if.empty + % Note that the first field must be between quotes + % because it is the fieldname for use in the warning message. + % +FUNCTION {warning.if.empty} +{ empty$ + { "No " swap$ * " in " * cite$ * warning$ } + { pop$ } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % issues warning if title, type, and howpublished are empty + % +FUNCTION {check.relevant.fields} +{ title empty$ + type empty$ and + howpublished empty$ and + { "No title, type, and howpublished in " cite$ * warning$ } + 'skip$ + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % delivers 1 if (both editor and translator + % not empty and not equal to each other) + % 0 if (editor or translator empty) or + % (editor = translator) + % +FUNCTION {editor.ne.trans} +{ translator empty$ + { #0 } + { editor empty$ + { #0 } + { translator editor = + { #0 } + { #1 } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {conv.int.to.str} +{ duplicate$ #10 < + { "0000" swap$ int.to.str$ * } + { duplicate$ #100 < + { "000" swap$ int.to.str$ * } + { duplicate$ #1000 < + { "00" swap$ int.to.str$ * } + { duplicate$ #10000 < + { "0" swap$ int.to.str$ * } + { int.to.str$ } + if$ + } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {ref.type} +{ type$ "article" = + type$ "magazine" = + type$ "newspaper" = + type$ "book" = + type$ "techreport" = + type$ "unpublished" = + type$ "misc" = + type$ "booklet" = + type$ "manual" = + type$ "proceedings" = + or + or + or + or + or + or + or + or + or + { #1 } + { type$ "incollection" = + type$ "phdthesis" = + type$ "mastersthesis" = + type$ "lecture" = + type$ "inbook" = + type$ "inproceedings" = + type$ "conference" = + type$ "intechreport" = + or + or + or + or + or + or + or + { #2 } + { type$ "literal" = + { #3 } + { #0 } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {is.atype} +{ type$ "article" = + type$ "magazine" = + type$ "newspaper" = + type$ "incollection" = + type$ "inbook" = + type$ "inproceedings" = + type$ "conference" = + type$ "intechreport" = + type$ "manual" = + or + or + or + or + or + or + or + or + { #1 } + { journal empty$ not + % + type$ "phdthesis" = + type$ "mastersthesis" = + or + % + and + { #1 } + { type$ "misc" = + type empty$ not and + { type "\bibmessage" = + type "\bibcomputerprogram" = + type "\bibcomputerprogrammanual" = + type "\bibcomputerprogramandmanual" = + type "\bibcomputersoftware" = + type "\bibcomputersoftwaremanual" = + type "\bibcomputersoftwareandmanual" = + type "\bibprogramminglanguage" = + or + or + or + or + or + or + or + { #1 } + { #0 } + if$ + } + { #0 } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % connects two strings with connect string + % if one of them empty, then connect string + % is left out + % + % call with S1 S2 connectstring connect.check + % +FUNCTION {connect.check} +{ 'u := + % + % if S2 = "" + % + duplicate$ empty$ + % + % then remove S2 + % + { pop$ + % + % S1 is on top of stack. + % if it is empty, it is replaced by the empty string "" + % + duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ + } + % + % else swap S1 and S2 so that S1 can be checked + % + { swap$ + % + % if S1 is empty, remove S1 so that S2 is left on the + % stack and is the result is given + % + duplicate$ empty$ + { pop$ } + % + % now the real work starts: + % push the connect string "C" + % so that top of stack is "C" "S1" "S2" + % concatenate, so that top of stack is + % "S1+C" "S2" + % + { u * + % + % swap and concatenate + % + swap$ * + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % connects two strings with space ("\ ") + % if length of second is 4 or larger, + % connects them with non-breaking space ("tie", "~") + % if length of second smaller than 4 + % + % call with S1 S2 tie.or.space.connect + % result: "S1\ S2" or "S1~S2" + % +FUNCTION {tie.or.space.connect} +{ duplicate$ text.length$ #4 < + { "~" } + { "\ " } + if$ + swap$ * * +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % connects two strings with comma (", ") + % if one of them is empty, the comma is left out + % + % call with S1 S2 connect.with.comma.check + % result: "S1, S2" + % +FUNCTION {connect.with.comma.check} +{ ", " connect.check } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % connects two strings with semicolon ("; ") + % if one of them is empty, semicolon is left out + % + % call with S1 S2 connect.with.semicolon.check + % result: "S1; S2" + % +FUNCTION {connect.with.semicolon.check} +{ "; " connect.check } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % connects two strings with colon (": ") + % if one of them is empty, colon is left out + % + % call with S1 S2 connect.with.colon.check + % result: "S1: S2" + % +FUNCTION {connect.with.colon.check} +{ ": " connect.check } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % connects two strings with space ("\ ") + % + % call with S1 S2 connect.with.space.check + % result: "S1\ S2" + % +FUNCTION {connect.with.space.check} +{ "\ " connect.check } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % encloses string in pre- and postfix string + % call with + % prefix postfix S enclose.check + % delivers empty string if S empty + % +FUNCTION {enclose.check} +{ duplicate$ empty$ + { pop$ pop$ pop$ + "" + } + { swap$ * * } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % emphasizes top of stack + % call with + % "string" emphasize.check + % +FUNCTION {emphasize.check} +{ "\Bem{" swap$ + "}" swap$ + enclose.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % brackets top of stack + % call with + % "string" bracket + % +FUNCTION {bracket.check} +{ "[" swap$ + "]" swap$ + enclose.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % parenthesizes top of stack + % call with + % "string" parenthesize + % +FUNCTION {parenthesize.check} +{ "(" swap$ + ")" swap$ + enclose.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % checks whether argument is "multiresult": + % whether it contains '-', '+', or ',' characters + % used with pages to check whether pp. or p. must be used + % +FUNCTION {multi.result.check} +{ 't := + #0 'multiresult := + % + % while (not multiresult) and (length(t) > 1) do + % + { multiresult not + t text.length$ #1 > + and + } + % + % if t(1-2) = "--" or t(1) = "+" or "," + % then multiresult = 1 + % else t = t(2-last) + % + { t #1 #2 substring$ 's := + "--" s = + { #1 'multiresult := } + { t #1 #1 substring$ 's := + "+" s = + "," s = + or + { #1 'multiresult := } + { t #2 global.max$ substring$ 't := } + if$ + } + if$ + } + while$ + multiresult +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % Checks whether an author is a corporate author, i.e., + % whether the field starts with "{\bibcorporate". + % Call with + % field is.bibcorporate + % +FUNCTION {is.bibcorporate} +{ #1 #14 substring$ "{\bibcorporate" = } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {sortify} +{ purify$ + "l" change.case$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {remove.spaces} +{ % Remove spaces from string. + % Works best if string only contains alphanumeric characters and spaces. + 's := % The original string + s text.length$ 'len := % Its length (no. of characters) + "" 't := % Initialize the transformed string + #0 'pos := + % + % while (pos < len) do + % + { pos len < } + { pos #1 + 'pos := + s pos #1 substring$ 'u := + % + % u is the pos-th character in s + % If it is a space, move to next character, + % else copy character to output. + % + u " " = + 'skip$ + { t u * 't := } + if$ + } + while$ + % + % Now push the result back on the stack + t +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % end block by writing what's left on the stack and + % starting a new line + % +FUNCTION {output.end.block} +{ write$ + newline$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % end block by adding a period and writing what's left + % on the stack and starting a new line + % +FUNCTION {output.dot.end.block} +{ add.period$ + output.end.block +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % starting new block by writing what's left on the stack, + % starting a new line and adding some extra space or + % whatever is more defined in \newblock + % +FUNCTION {output.new.block} +{ output.end.block + "\newblock" write$ newline$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % starting new block by writing what's left on the stack, + % starting a new line and adding some extra space or + % whatever is more defined in \newblock + % +FUNCTION {output.dot.new.block} +{ add.period$ + output.new.block +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {start.new.block} +{ "\unskip\ " write$ newline$ + "\newblock " write$ newline$ +} + +FUNCTION {sort.name.format.classic} { "{ll{}}{ f{}}{ vv{}}{ jj{}}" } + +FUNCTION {cite.name.format.classic} { "{ll}" } + +FUNCTION {author.name.format.classic} { "{ll}{, f{.}.}{ vv}{, jj}" } + +FUNCTION {index.name.format.classic} { "{ll}{, f{.}.}{ vv}{, jj}" } + +FUNCTION {sort.name.format} { "{vv{}}{ll{}}{ f{}}{ jj{}}" } + +FUNCTION {cite.name.format} { "{vv }{ll}" } + +FUNCTION {cite.initials.name.format} { "{f{.}.~~}{vv }{ll}{ jj}" } + +FUNCTION {author.name.format} { "{vv }{ll}{, f{.}.}{, jj}" } + +FUNCTION {editor.name.format} { "{f{.}.~~}{vv }{ll}{ jj}" } + +FUNCTION {index.name.format} { "{vv }{ll}{, f{.}.}{, jj}" } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {init.initials} +{ "yyyyy" 'aut1f.old := + "yyyyy" 'aut1s.old := + #0 'cite.initials.old := +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {update.no.initials} +{ 'field := + field 'aut1f.old := + field 'aut1s.old := + #0 'cite.initials.old := +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {check.add.initials.aut} +{ % + % If last name is equal to previous last name + % but initials are different, then initials should + % be cited. If initials are also the same, initials + % should be cited if that is the case for the previous + % author . + % + aut1s aut1s.old = + { aut1f aut1f.old = + { cite.initials.old 'cite.initials := } + { #1 'cite.initials := + aut1f 'aut1f.old := + aut1s 'aut1s.old := + cite.initials 'cite.initials.old := + } + if$ + } + { % + % Different last name. + aut1f 'aut1f.old := + aut1s 'aut1s.old := + cite.initials 'cite.initials.old := + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {check.add.initials.field} +{ 'field := + field #1 cite.initials.name.format format.name$ 'aut1f := + field #1 cite.name.format format.name$ 'aut1s := + % + % Now do the actual work + % + check.add.initials.aut +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {check.add.initials} +{ % + % Check whether author or editor or other field acts as author. + % Initials are only relevant with author or editor. + % + firstkey empty$ not + { key empty$ not + { % + % Both key and firstkey are nonempty. + % Then, key is treated as last name of first author, + % and firstkey is treated as last name + initials of + % first author . + % + firstkey sortify remove.spaces 'aut1f := + key sortify remove.spaces 'aut1s := + check.add.initials.aut + } + { firstkey sortify remove.spaces update.no.initials } + if$ + } + { key empty$ not + { key sortify remove.spaces update.no.initials } + { % + % No key or firstkey, so find out which field + % to use as author. + % + % Check reference type: + % if result is 1 then possibly editor acts as author + % 2 then editor does not act as author + % 3 then key should have been used + % 0 then unknown reference type + ref.type #2 = + { % + % Format first author with and without initials + author empty$ + { title.sort.label update.no.initials } + { author check.add.initials.field } + if$ + } + { % + % Format first author with and without initials + author empty$ + { editor empty$ + { title.sort.label update.no.initials } + { editor check.add.initials.field } + if$ + } + { author check.add.initials.field } + if$ + } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {tentative.cite.num.names.field} +{ 'field := + field num.names$ 'numnames := + numnames #3 < + { % + % 1 or 2 names: always cite all of them. + numnames 'cite.num.names.full := + numnames 'cite.num.names.short := + } + { numnames #6 < + { % + % 3-5 names: cite all of them the first time, + % only the first name later times + numnames 'cite.num.names.full := + #1 'cite.num.names.short := + } + { % + % 6 or more names: cite only the first name + #1 'cite.num.names.full := + #1 'cite.num.names.short := + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {tentative.cite.num.names} +{ % + % Check whether author or editor or other field acts as author. + % Number of names is only relevant with author or editor. + % + firstkey empty$ not + { + #1 'cite.num.names.full := + #1 'cite.num.names.short := + } + { key empty$ not + { + #1 'cite.num.names.full := + #1 'cite.num.names.short := + } + { % + % No key or firstkey, so find out which field + % to use as author. + % + % Check reference type: + % if result is 1 then possibly editor acts as author + % 2 then editor does not act as author + % 3 then key should have been used + % 0 then unknown reference type + ref.type #2 = + { % + % Format first author with and without initials + author empty$ + { + #1 'cite.num.names.full := + #1 'cite.num.names.short := + } + { author tentative.cite.num.names.field } + if$ + } + { % + % Format first author with and without initials + author empty$ + { editor empty$ + { + #1 'cite.num.names.full := + #1 'cite.num.names.short := + } + { editor tentative.cite.num.names.field } + if$ + } + { author tentative.cite.num.names.field } + if$ + } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {init.cite.num.names} +{ #0 'cite.num.names.old := + #0 'numnames.old := + "yyyy" 'year.label.old := + #0 'add.to.year.old := + "" 'aut1f.old := + "" 'aut2.old := + "" 'aut3.old := + "" 'aut4.old := + "" 'aut5.old := + "" 'aut6.old := +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {update.cite.num.names} +{ cite.num.names.short 'cite.num.names.old := + numnames 'numnames.old := + year.label 'year.label.old := + add.to.year 'add.to.year.old := + aut1f 'aut1f.old := + aut2 'aut2.old := + aut3 'aut3.old := + aut4 'aut4.old := + aut5 'aut5.old := + aut6 'aut6.old := +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.6.authors} +{ % + % First author: with initials. + % + field #1 cite.initials.name.format format.name$ 'aut1f := + % + % Second and later authors: without initials. + % + numnames #1 > + name.max #1 > + and + { % + % 2nd author + field #2 cite.name.format format.name$ 'aut2 := + % + numnames #2 > + name.max #2 > + and + { % + % 3nd author + field #3 cite.name.format format.name$ 'aut3 := + % + numnames #3 > + name.max #3 > + and + { % + % 4th author + field #4 cite.name.format format.name$ 'aut4 := + % + numnames #4 > + name.max #4 > + and + { % + % 5th author + field #5 cite.name.format format.name$ 'aut5 := + % + numnames #5 > + name.max #5 > + and + { % + % 6th author + field #6 cite.name.format format.name$ 'aut6 := + } + { % + % 5 authors: 6 is empty + % + "" 'aut6 := + } + if$ + } + { % + % 4 authors: 5-6 are empty + % + "" 'aut5 := + "" 'aut6 := + } + if$ + } + { % + % 3 authors: 4-6 are empty + % + "" 'aut4 := + "" 'aut5 := + "" 'aut6 := + } + if$ + } + { % + % 2 authors: 3-6 are empty + % + "" 'aut3 := + "" 'aut4 := + "" 'aut5 := + "" 'aut6 := + } + if$ + } + { % + % Only 1 author: 2-6 are empty + % + "" 'aut2 := + "" 'aut3 := + "" 'aut4 := + "" 'aut5 := + "" 'aut6 := + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {change.add.to.year} +{ + forward #1 = + { % + % Moving forward: this add.to.year number must be 1 higher than + % previous. + % + add.to.year.old #0 > + { add.to.year.old #1 + 'add.to.year := } + { #2 'add.to.year := } + if$ + } + { % + % Moving backward: this add.to.year number must be 1 lower than + % previous. + % + add.to.year.old #1 - 'add.to.year := + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {definitive.cite.num.names.1.or.2} +{ % + numnames numnames.old = + { % + % Same number of names: ambiguity could arise. Check whether current + % and previous have the same author(s). + % + aut1f aut1f.old = + { % + % Same first author: if the second author is also the same or if + % there is only one author, a's and b's should be added. + % + aut2 aut2.old = + numnames #2 = + and + % + numnames #1 = + or + { % + % Same author(s): add to year. + % + change.add.to.year + } + { % + % Different second author: no ambiguity possible. + % + skip$ + } + if$ + } + { % + % Different first author: no ambiguity possible. + % + skip$ + } + if$ + } + { % + % Different number of names: no ambiguity possible. + % + skip$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {definitive.cite.num.names.3.or.more} +{ % + % Check whether current and previous have the same first author. + % + aut1f aut1f.old = + { % + % Same first author: check second author + % + aut2 aut2.old = + { % + % Same 1st & 2nd author: check 3rd. + % + aut3 aut3.old = + { % + % Same 1st-3rd authors: check 4th. + % + numnames.old #3 = + { numnames #3 = + { % + % Both current and previous have 3 authors, which are + % the same, so both have identical author-year + % combinations, so ambiguity should be resolved by + % a's and b's. Check whether more authors were + % necessary for previous one. + % + change.add.to.year + cite.num.names.short cite.num.names.old < + { cite.num.names.old + 'cite.num.names.short := + } + 'skip$ + if$ + } + { % + % Previous has 3 authors, current has more, with same + % first 3, so at least 4 must be used for current to + % make a difference. + % + cite.num.names.short #4 < + { #4 'cite.num.names.short := } + 'skip$ + if$ + } + if$ + } + { numnames #3 = + { % + % Current has 3 authors, previous has more, with same + % first 3, so all 3 of current must be used. + % + numnames 'cite.num.names.short := + } + { % + % Same 1st-3rd author and both current and previous + % have at least 4 authors: check 4th. + % + aut4 aut4.old = + { % + % Same 1st-4th authors: check 5th. + % + numnames.old #4 = + { numnames #4 = + { % + % Both current and previous have 4 authors, + % which are the same, so both have + % identical author-year combinations, so + % ambiguity should be resolved by a's and + % b's. Check whether more authors were + % necessary for previous one. + % + change.add.to.year + cite.num.names.short cite.num.names.old < + { cite.num.names.old + 'cite.num.names.short := + } + 'skip$ + if$ + } + { % + % Previous has 4 authors, current has more, + % with same first 4, so at least 5 must be + % used for current to make a difference. + % + cite.num.names.short #5 < + { #5 'cite.num.names.short := } + 'skip$ + if$ + } + if$ + } + { numnames #4 = + { % + % Current has 4 authors, previous has more, + % with same first 4, so all 4 of current + % must be used. + % + numnames 'cite.num.names.short := + } + { % + % Same 1st-4th author and both current and + % previous have at least 5 authors: check + % 5th. + % + aut5 aut5.old = + { % + % Same 1st-5th authors: check 6th. + % + numnames.old #5 = + { numnames #5 = + { % + % Both current and previous + % have 5 authors, which are the + % same, so both have identical + % author-year combinations, so + % ambiguity should be resolved + % by a's and b's. Check whether + % more authors were necessary + % for previous one. + % + change.add.to.year + cite.num.names.short + cite.num.names.old < + { cite.num.names.old + 'cite.num.names.short := + } + 'skip$ + if$ + } + { % + % Previous has 5 authors, + % current has more, with same + % first 5, so at least 6 must + % be used for current to make + % a difference. + % + cite.num.names.short #6 < + { #6 'cite.num.names.short := } + 'skip$ + if$ + } + if$ + } + { numnames #5 = + { % + % Current has 5 authors, + % previous has more, with same + % first 5, so all 5 of current + % must be used. + % + numnames 'cite.num.names.short := + } + { % + % Same 1st-5th author and both + % current and previous have at + % least 6 authors. If one has + % 6 authors and the other has + % more or the 6th is different, + % 6 should be used (which is + % the maximum). + % + numnames #6 > + numnames.old #6 = + and + % + numnames #6 = + numnames.old #6 > + and + % + or + % + aut6 aut6.old = + not + % + or + { #6 cite.num.names.short < + { #6 + 'cite.num.names.short + := + } + 'skip$ + if$ + } + { % + % The first 6 authors are + % the same and either both + % have 6 or both have more. + % So for all practical + % purposes they have + % identical author-year + % combination, so ambiguity + % should be resolved by a's + % and b's. Check whether + % more authors were + % necessary for previous + % one. + % + change.add.to.year + cite.num.names.short + cite.num.names.old + < + { cite.num.names.old + 'cite.num.names.short + := + } + 'skip$ + if$ + } + if$ + } + if$ + } + if$ + } + { % + % Different 5th author: citing 5 authors is + % sufficient for this comparison. + % + cite.num.names.short #5 < + { #5 'cite.num.names.short := } + 'skip$ + if$ + } + if$ + } + if$ + } + if$ + } + { % + % Different 4th author: citing 4 authors is + % sufficient for this comparison. + % + cite.num.names.short #4 < + { #4 'cite.num.names.short := } + 'skip$ + if$ + } + if$ + } + if$ + } + if$ + } + { % + % Different 3rd author: citing 3 authors is sufficient for this + % comparison. + % + cite.num.names.short #3 < + { #3 'cite.num.names.short := } + 'skip$ + if$ + } + if$ + } + { % + % Different 2nd author: citing 2 authors is sufficient for this + % comparison. + % + cite.num.names.short #2 < + { #2 'cite.num.names.short := } + 'skip$ + if$ + } + if$ + } + { % + % Different first author: no ambiguity, move to next entry. + % + skip$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {definitive.cite.num.names.field} +{ 'field := + field num.names$ 'numnames := + % + % Format authors + % + format.6.authors + % + % Now compare authors with authors of previous entry. + % + cite.num.names.short numnames.old > + { % + % The previous entry has less authors than already defined + % necessary to be cited. No ambiguity is possible and we're ready. + % + skip$ + } + { % + % Both previous and current entry have at least one author . + % + year.label year.label.old = + { % + % Same year label: possibly ambiguous citation. + % + % First check: current and/or previous have 1 or + % 2 authors. + % + numnames #3 < + numnames.old #3 < + or + % + { definitive.cite.num.names.1.or.2 } + { definitive.cite.num.names.3.or.more } + if$ + } + { % + % Different year label: everything's fine, + % move to next entry. + % + skip$ + } + if$ + } + if$ + % + % If during the previous process the name maximum is exceeded + % (which was not checked), correct this. NOTE: If the name + % maximum is smaller than 6, this could lead to ambiguous + % citations if, e.g., the year and the first 5 authors are + % the same, but the 6th author is different. + % + cite.num.names.short name.max > + { name.max 'cite.num.names.short := } + 'skip$ + if$ + % + % For a "full" cite, the number of names should always be at least + % as large as for a "short" cite. + % + cite.num.names.full cite.num.names.short < + { cite.num.names.short 'cite.num.names.full := } + 'skip$ + if$ + % + % Update "old" variables for next entry. + % + update.cite.num.names +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {definitive.cite.no.names} +{ % + % The formatted field that acts as author is on top + % of the stack. + 'aut1f := + "" 'aut2 := + "" 'aut3 := + "" 'aut4 := + "" 'aut5 := + "" 'aut6 := + #1 'numnames := + % + year.label year.label.old = + { % + % Same year label: possibly ambiguous citation. + % + definitive.cite.num.names.1.or.2 + } + { % + % Different year label: everything's fine, + % move to next entry. + % + skip$ + } + if$ + % + % Update "old" variables for next entry. + % + update.cite.num.names +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {definitive.cite.num.names} +{ % + % Check whether author or editor or other field acts as author. + % Number of names is only relevant with author or editor. + % + firstkey empty$ not + { firstkey sortify remove.spaces definitive.cite.no.names } + { key empty$ not + { key sortify remove.spaces definitive.cite.no.names } + { % + % No key or firstkey, so find out which field + % to use as author. + % + % Check reference type: + % if result is 1 then possibly editor acts as author + % 2 then editor does not act as author + % 3 then key should have been used + % 0 then unknown reference type + ref.type #2 = + { % + % Format first author with and without initials + author empty$ + { title.sort.label definitive.cite.no.names } + { author definitive.cite.num.names.field } + if$ + } + { % + % Format first author with and without initials + author empty$ + { editor empty$ + { title.sort.label definitive.cite.no.names } + { editor definitive.cite.num.names.field } + if$ + } + { author definitive.cite.num.names.field } + if$ + } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.tentative.year.sort.label} +{ % + % Implicit or explicit ``no date'' is put at the front + % (the year zero; years B.C. will imply complications) + % because these are possibly old works. + % ``In press'' is put at the end. + % + year empty$ + { "0000" 'year.label := } + { year "\bibnodate" = + year "l" change.case$ "no date" = or + year "l" change.case$ "n.d." = or + { "0000" 'year.label := } + { year "\BIP" = + year "l" change.case$ "in press" = or + year "l" change.case$ "forthcoming" = or + { "9999" 'year.label := } + { % It is not checked whether the year field + % makes sense. + year sortify remove.spaces 'year.label := + } + if$ + } + if$ + } + if$ + % + % Push year sort label on the stack + year.label +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {month.number.day} +{ month empty$ + { "" } + { month sortify remove.spaces + % + % Add the day when available. + day empty$ + 'skip$ + { "/" * + day sortify remove.spaces * + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.name.sort.label} +{ % + % Author or editor-acting-as-author available. + % => Make tentative "short cite with initials" author + % label (L1) of one of the forms + % "Last1 F1" + % "Last1 F1 Last2" + % "Last1 F1 zzzz" ("zzzz" representing et al.) + % => If more than 2 'authors': make label (L2) for 2nd-6th authors + % of one of the forms + % "Last2 Last3" + % "Last2 Last3 Last4" + % "Last2 Last3 Last4 Last5" + % "Last2 Last3 Last4 Last5 Last6" + % "Last2 Last3 Last4 Last5 Last6 zzzz" + % + % Then format year label (L3) of one of the forms: + % "0000" (missing year or explicit 'no date') + % "9999" ('in press') + % year (otherwise; don't use originalyear here yet) + % + % From earlier sorting of titles, we have title number. Convert + % to string, which gives title label (L4) . + % + % Then tentative sorting label (author.year.sort.label) is a + % concatenation of + % L1 + % " " + % L3 + % " " + % L2 + % " " + % L4 + % + % The name field is on top of the stack. + 'field := + % + % numnames is the total number of names contained in field + field num.names$ 'numnames := + % + % Format first author + field #1 sort.name.format format.name$ + % + % Format the second author if there are two, or else "zzzz" = et al. + numnames #1 = + 'skip$ + { numnames #2 = + { % + % Two authors: format second author + field #2 "{ll{}}" format.name$ 's := + s "others" = + { " zzzz" * } % Add "et al."-substitute + { " " * s * } % Add second author + if$ + } + { " zzzz" * } % 3 or more authors: add "et al."-substitute + if$ + } + if$ + " " * % Add spaces + make.tentative.year.sort.label * % Add year (L3). + " " * % Add spaces + % + % Now build up L2 if applicable + numnames #3 < + 'skip$ + { % + % Treat last author slightly differently + numnames name.max > + { name.max 'lastname := + " zzzz" % Push "et al."-substitute on stack + } + { numnames 'lastname := + "" % Push empty string on stack + } + if$ + % + % Names 2 to "last" - 1 + "" % Push empty string on stack + #2 'nameptr := + { nameptr lastname < } + { % Add name no. nameptr + field nameptr "{ll{}}" format.name$ * + " " * + nameptr #1 + 'nameptr := + } + while$ + % + % "Last" author + field lastname "{ll{}}" format.name$ 's := + s "others" = + { "zzzz" * } % Add "et al."-substitute + { s * } % Add last author + if$ + % + swap$ * % Add the previously formatted empty string or + % "et al."-substitute if there are many authors. + * % Add L2 to the earlier labels. + } + if$ + % + " " * % Add spaces + title.number conv.int.to.str * % Add sorted title number (L4). + sortify % Clean up and convert to lowercase + " " * % Add spaces + month.number.day * % Add month and day when available + 'author.year.sort.label := % Assign result to sort label. +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.field.year.sort.label} +{ % + % 'field' acts as first author (L1), subsequent authors + % are empty (L2). + % + % Then format year label (L3) of one of the forms: + % "0000" (missing year or explicit 'no date') + % "9999" ('in press') + % year (otherwise; don't use originalyear here yet) + % + % From earlier sorting of titles, we have title number. Convert + % to string, which gives title label (L4) . + % + % Then tentative sorting label (author.year.sort.label) is a + % concatenation of + % L1 + % " " + % L3 + % " " + % L2 + % " " + % L4 + % + % 'field' is on top of the stack. It is already supposed to be cleaned + % (i.e., sortified and space-removed), so this is already L1. + " " * % Add spaces to L1 + make.tentative.year.sort.label * % Add year (L3). + " " * % Add spaces + " " * % L2 is empty, add spaces + title.number conv.int.to.str * % Add sorted title number (L4). + sortify % Clean up and convert to lowercase + " " * % Add spaces + month.number.day * % Add month and day when available + 'author.year.sort.label := % Assign result to sort label. +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.author.editor.sort.label} +{ author empty$ + { editor empty$ + { % + % Use what has previously been stored in title.sort.label + % as author substitute . + title.sort.label make.field.year.sort.label + } + { editor make.name.sort.label } + if$ + } + { author make.name.sort.label } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.author.sort.label} +{ author empty$ + { % + % Use what has previously been stored in title.sort.label + % as author substitute . + title.sort.label make.field.year.sort.label + } + { author make.name.sort.label } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.tentative.sort.label} +{ % + %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % General strategy: + % + % Ordinary situation: author or editor-acting-as-author + % available. + % => Make tentative "short cite with initials" author + % label (L1) of one of the forms + % "Last1 F1" + % "Last1 F1 Last2" + % "Last1 F1 zzzz" ("zzzz" representing et al.) + % => If more than 2 'authors': make label (L2) for 2nd-6th authors + % of one of the forms + % "Last2 Last3" + % "Last2 Last3 Last4" + % "Last2 Last3 Last4 Last5" + % "Last2 Last3 Last4 Last5 Last6" + % "Last2 Last3 Last4 Last5 Last6 zzzz" + % When key is available (overrules author and editor fields): + % => L1 = key, L2 = "" + % No author, editor, and key: define title or substitute as key + % and format as key. + % + % Then format year label (L3) of one of the forms: + % "0000" (missing year or explicit 'no date') + % "9999" ('in press') + % year (otherwise; don't use originalyear here yet) + % + % From earlier sorting of titles, we have title number. Convert + % to string, which gives title label (L4) . + % + % Then tentative sorting label (author.year.sort.label) is a + % concatenation of + % L1 + % " " + % L3 + % " " + % L2 + % " " + % L4 + % + % This can then be sorted, from which it can be derived + % whether initials are necessary, how many names must + % be used for short and full citations, and whether "a"'s and + % "b"'s etc. are necessary behind the year labels. + %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % key and firstkey overrule author information + % + firstkey empty$ not + { key empty$ not + { % + % Both key and firstkey available: + % for sorting and checking initials, treat key as last + % name and firstkey as initials. + % + key sortify remove.spaces + " " * + firstkey sortify remove.spaces * + make.field.year.sort.label + } + { firstkey sortify remove.spaces make.field.year.sort.label } + if$ + } + { key empty$ not + { key sortify remove.spaces make.field.year.sort.label } + { % + % No key or firstkey, so find out which field + % to use as author. + % + % Check reference type: + % if result is 1 then possibly editor acts as author + % 2 then editor does not act as author + % 3 then key should have been used + % 0 then unknown reference type + ref.type + duplicate$ #1 = + { pop$ + make.author.editor.sort.label + } + { duplicate$ #2 = + { pop$ + make.author.sort.label + } + { #3 = + { "no key in " cite$ * warning$ + make.author.editor.sort.label + } + { make.author.editor.sort.label } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + % + author.year.sort.label 'sort.key$ := +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.definitive.name.sort.label} +{ % + % Author or editor-acting-as-author available. + % => Make author-with-initials label (L1) of one of the forms + % "Last1 F1 Last2 F2 ... LastN FN" + % "Last1 F1 Last2 F2 ... Last6 F6 zzzz" + % (where N <= 6 is the total number of authors, and + % "zzzz" represents et al. if there are more than 6 authors) + % No author, editor, and key: define title or substitute as sort key. + % + % The name field is on top of the stack. + 'field := + % + % numnames is the total number of names contained in field + field num.names$ 'numnames := + % + % If there are more than 6 authors, only 6 are mentioned. + numnames name.max > + { name.max 'format.num.names := } + { numnames 'format.num.names := } + if$ + % Initialize stack with empty string + "" + % + % Cycle over authors. + #1 'nameptr := + { nameptr format.num.names < } + { % Format author and add spaces + field nameptr sort.name.format format.name$ * + " " * + nameptr #1 + 'nameptr := + } + while$ + % Format last author that must be formatted + field nameptr sort.name.format format.name$ * + % Add et al. if necessary + nameptr numnames < + { " zzzz" * } + 'skip$ + if$ + sortify % Clean up and change case + " " * % Add spaces + year.label * % Add year + " " * % Add spaces + title.number conv.int.to.str * % Add sorted title number + " " * % Add spaces + month.number.day * % Add month and day when available + 'author.year.sort.label := % Assign result to sort label. +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.definitive.field.year.sort.label} +{ % + % 'field' acts as author (L1). + % + % Then format year label (L2) of one of the forms: + % "0000" (missing year or explicit `no date') + % "9999" (`in press') + % year (otherwise; don't use originalyear here yet) + % + % From earlier sorting of titles, we have title number. Convert + % to string, which gives title label (L3) . + % + % Then tentative sorting label (author.year.sort.label) is a + % concatenation of + % L1 + % " " + % L2 + % " " + % L3 + % + % 'field' is on top of the stack. It is already supposed to be cleaned + % (i.e., sortified and space-removed), so this is already L1. + " " * % Add spaces + year.label * % Add year + " " * % Add spaces + title.number conv.int.to.str * % Add sorted title number + " " * % Add spaces + month.number.day * % Add month and day when available + 'author.year.sort.label := % Assign result to sort label. +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.definitive.author.editor.sort.label} +{ author empty$ + { editor empty$ + { % + % Use what has previously been stored in title.sort.label + % as author substitute . + title.sort.label make.definitive.field.year.sort.label + } + { editor make.definitive.name.sort.label } + if$ + } + { author make.definitive.name.sort.label } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.definitive.author.sort.label} +{ author empty$ + { % + % Use what has previously been stored in title.sort.label + % as author substitute . + title.sort.label make.definitive.field.year.sort.label + } + { author make.definitive.name.sort.label } + if$ +} +FUNCTION {make.final.sort.key} +{ ref.type #2 = + { make.definitive.author.sort.label } + { make.definitive.author.editor.sort.label } + if$ + unsorted + { citeorder.sort.label 'sort.key$ := } + { author.year.sort.label 'sort.key$ := } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {chop.word} +{ 's := + 'len := + s #1 len substring$ = + { s len #1 + global.max$ substring$ } + { s } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {chop.articles} +{ 's := + "a " #2 + "an " #3 + "the " #4 + s + chop.word + chop.word + chop.word +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.sort.title} +{ % + % Remove non-alphanumeric characters and change to lower case . + sortify + % + % Remove "a ", "an ", and "the " from the front . + chop.articles #1 entry.max$ substring$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.sort.title} +{ title empty$ + { text empty$ + { type empty$ + { howpublished empty$ + { note empty$ + { url empty$ + { " " } + { url format.sort.title } + if$ + } + { note format.sort.title } + if$ + } + { howpublished format.sort.title } + if$ + } + { type format.sort.title } + if$ + } + { text format.sort.title } + if$ + } + { title format.sort.title } + if$ + remove.spaces + 'title.sort.label := + title.sort.label 'sort.key$ := +} +FUNCTION {make.title.number} +{ title.sort.label old.label = + { + old.number 'title.number := + } + { + old.number #1 + 'title.number := + title.number 'old.number := + title.sort.label 'old.label := + } + if$ +} +FUNCTION {make.citeorder.number} +{ old.number #1 + 'cite.order := + cite.order 'old.number := + cite.order conv.int.to.str 'citeorder.sort.label := +} + +FUNCTION {last.part.name.format.classic} { "{ll}" } + +FUNCTION {von.junior.name.format.classic} { "{ vv}{, jj}" } + +FUNCTION {last.part.name.format} { "{vv }{ll}" } + +FUNCTION {initials.with.space.name.format} { "{f.}" } + +FUNCTION {von.last.junior.name.format} { "{vv }{ll}{ jj}" } + +FUNCTION {von.junior.name.format} { "{, jj}" } + +FUNCTION {one.complete.name.format} { "{vv }{ll}{, jj}{, ff}" } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {string.length} +{ #0 'pos := + % If the next character exists, i.e., is not empty, + % add 1 to the string length. + % We cannot use empty$ because " " empty$ is true. + { duplicate$ pos #1 + #1 substring$ "" = not } + { pos #1 + 'pos := } + while$ + pop$ pos +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {transform.spaces.and.hyphens} +{ 's := % The original string + s string.length 'len := % Its length (no. of characters) + "" 't := % Initialize the transformed string + #1 'pos := + #0 'brace.level := + % + % while (pos < len) do + % + { pos len < } + { % First, check whether we are at brace level 0 + brace.level #0 = + { + % At least two characters left: check for ". ", ".~", and ".-". + % If so, replace and shift two positions. + s pos #2 substring$ ". " = + s pos #2 substring$ ".~" = or + { t "." * 't := + pos #2 + 'pos := + } + { s pos #2 substring$ ".-" = + { t "\BHBI " * 't := + pos #2 + 'pos := + } + { % neither is true, copy one character and shift one position + t s pos #1 substring$ * 't := + % Check whether we need to increase brace level. + % Note that this is not sophisticated: it does not capture + % \{, \verb+}+, etc. + % Note also that unbalanced braces cause problems. + s pos #1 substring$ "{" = + { brace.level #1 + 'brace.level := } + 'skip$ + if$ + pos #1 + 'pos := + } + if$ + } + if$ + } + { % Not at brace level 0: copy result literally + t s pos #1 substring$ * 't := + % Check whether we need to increase or decrease brace level. + % Note that this is not sophisticated: it does not capture + % \{, \verb+}+, etc. + s pos #1 substring$ "{" = + { brace.level #1 + 'brace.level := } + { s pos #1 substring$ "}" = + { brace.level #1 - 'brace.level := } + 'skip$ + if$ + } + if$ + pos #1 + 'pos := + } + if$ + } + while$ + % + pos len = + { % Last character, copy + t s pos #1 substring$ * 't := + } + { % pos = len + 1, so s ends with ". " or ".-" + % This should not have happened, but make the best out of it. + % Push last two characters of s on the stack, i.e., ". " or ".-". + s len #1 - #2 substring$ + % Remove "\BPBI " or "\BHBI " from t + t text.length$ 'len := % Length of t (no. of characters) + t #1 len #6 - substring$ + % Concatenate and assign to t + swap$ * 't := + } + if$ + % + % Now push the result back on the stack + t +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.initials.with.hyphen} +{ % Format initials. + % Call with + % field authornumber format.initials.with.hyphen + % e.g. + % author #1 format.initials.with.hyphen + % Instead of field, a string may also be used. + % + % First, format initials in the default way, retaining spaces + % and hyphens. + initials.with.space.name.format format.name$ + transform.spaces.and.hyphens +} + +FUNCTION {format.last.part.name} +{ % Format a name with last.part.name.format, + % as part of more complicated things. + % Call with + % field authornumber format.last.part.name + % e.g. + % author #1 format.last.part.name + % Instead of field, a string may also be used. + last.part.name.format format.name$ +} + +FUNCTION {format.von.last.junior.name} +{ % Format a name with von.last.junior.name.format, + % for citing or as part of more complicated things. + % Call with + % field authornumber format.von.last.junior.name + % e.g. + % author #1 format.von.last.junior.name + % Instead of field, a string may also be used. + von.last.junior.name.format format.name$ +} + +FUNCTION {format.von.junior.name} +{ % Format a name with von.last.junior.name.format, + % for citing or as part of more complicated things. + % Call with + % field authornumber format.von.junior.name + % e.g. + % author #1 format.von.junior.name + % Instead of field, a string may also be used. + von.junior.name.format format.name$ +} + +FUNCTION {format.cite.initials.name} +{ % Format a name for citing with initials. + % Call with + % field authornumber format.cite.initials.name + % e.g. + % author #1 format.cite.initials.name + % Instead of field, a string may also be used. + % + % First, extract the complete name, format it in the canonical form, + % and push on the stack. + one.complete.name.format format.name$ + % + % Format the initials and push on the stack. + duplicate$ #1 format.initials.with.hyphen + % + % Format the von-last-junior part and push on the stack. + swap$ #1 format.von.last.junior.name + % + % Connect with "~" hyphen (if they're both non-empty). + "~" connect.check +} + +FUNCTION {format.author.name} +{ % Format an author name for the reference list. + % Call with + % field authornumber format.author.name + % e.g. + % author #1 format.author.name + % Instead of field, a string may also be used. + % + % First, extract the complete name, format it in the canonical form, + % and push on the stack. + one.complete.name.format format.name$ + % + % Make two copies of the name, format the last name and push on the stack. + duplicate$ duplicate$ #1 format.last.part.name + % + % Format the initials and push on the stack. + swap$ #1 format.initials.with.hyphen + % + % Connect with last name. + connect.with.comma.check + % + % Format the von-junior part and connect with initials. + swap$ #1 format.von.junior.name "" connect.check +} + +FUNCTION {format.editor.name} +{ % Format a name for the reference list as an editor. + % Call with + % field authornumber format.editor.name + % e.g. + % author #1 format.editor.name + % Instead of field, a string may also be used. + % + format.cite.initials.name +} + +FUNCTION {format.index.name} +{ % Format an author name for the index. + % Call with + % field authornumber format.index.name + % e.g. + % author #1 format.index.name + % Instead of field, a string may also be used. + % + format.author.name +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +FUNCTION {comma.between.two} { "\BCBT {}" } + +FUNCTION {comma.between.names} { ", " } + +FUNCTION {comma.before.last} { "\BCBL {}" } + +FUNCTION {dots.before.last} { "\BDBL {}" } + +FUNCTION {and.before.last} { "\ \BBA {} " } + +FUNCTION {no.and.before.last} { " " } + +FUNCTION {et.al.string.cite} { "\ \protect \BOthers {.}" } + +FUNCTION {et.al.string} { "\ \BOthers {.}" } + +FUNCTION {et.al.string.period} { "\ \BOthersPeriod {.}" } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {add.name.index} +{ % + % + make.index + { "%" * write$ newline$ + % Check for corporate author + field is.bibcorporate + { "\corporateAX{" } + { "\AX{" } + if$ + write$ + field nameptr sort.name.format format.name$ sortify write$ newline$ + "@" write$ + field nameptr format.index.name + "}%" * write$ newline$ + } + { "%" * write$ newline$ } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.name.cite.label} +{ 'field := + 'format.num.names := + % + field num.names$ 'numnames := % numnames is the total number of names + % contained in field + % + % It is implicit in the APA manual that if "et al." would refer + % to exactly one author, then this author should be named + % instead of "et al." + % + format.num.names numnames #1 - = + { numnames 'format.num.names := } + 'skip$ + if$ + % + % Format first author: with or without initials + % + #1 'nameptr := + cite.initials #1 = + { field nameptr format.cite.initials.name } + { field nameptr cite.name.format format.name$ } + if$ + add.name.index % Add index entry when desired. + % + numnames #1 = + 'skip$ + { format.num.names #1 = + { % + % First author et al. + % + et.al.string.cite write$ + } + { numnames #2 = + { % + % Given that format.num.names > 1, it is 2. + % Format second author. + % + #2 'nameptr := + field nameptr cite.name.format format.name$ 's := + % + % Check if 2nd author is explicit "others". + % If so, insert "et al." string. + % + s "others" = + { et.al.string.cite write$ } % First et al. + { % + % First \& Second + % + and.before.last write$ + s + add.name.index % Add index entry when desired. + } + if$ + } + { % + % 3 or more names, 2 or more must be cited + % + % for nameptr := 2 to format.num.names - 1 do + % + #2 'nameptr := + { nameptr format.num.names < } + { % + % Put comma between consecutive authors + % + comma.between.names write$ + % + % Format and add next author + % + field nameptr cite.name.format format.name$ + add.name.index % Add index entry when desired. + % + % Move to next author + % + nameptr #1 + 'nameptr := + } + while$ + % + % nameptr = format.num.names + % Format this author. + % + field nameptr cite.name.format format.name$ 's := + % + format.num.names numnames = + { % + % This is also the last author. Add (optional) comma. + % + comma.before.last write$ + % + % Check if this author is explicit "others". + % If so, insert "et al." string. + % + s "others" = + { et.al.string.cite write$ } + { and.before.last write$ + s + add.name.index % Add index entry when desired. + } + if$ + } + { % + % This is not the last author. + % Add comma, author name, and "et al." + % + comma.between.names write$ + s + add.name.index % Add index entry when desired. + % + comma.before.last et.al.string.cite * write$ + } + if$ + } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.title.cite.label} +{ % + % Formatting: check if formatted as article title or + % as book title, and insert this formatting. + % + is.atype + { "\APACciteatitle {" } + { "\APACcitebtitle {" } + if$ + % + title empty$ + { text empty$ + { type empty$ + { howpublished empty$ + { note empty$ + { url empty$ + { cite$ } + { url } + if$ + } + { note } + if$ + } + { howpublished } + if$ + } + { type } + if$ + } + { text } + if$ + } + { title } + if$ + % + % Connect with formatting. + % + * "}" * + % + % Write to output + % + write$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.author.editor.cite.label} +{ author empty$ + { editor empty$ + { % + % No author or editor: + % Use title or other description as citation label. + % + make.title.cite.label + "}{%" write$ newline$ + make.title.cite.label + } + { cite.num.names.full editor make.name.cite.label + "}{%" write$ newline$ + cite.num.names.short editor make.name.cite.label + } + if$ + } + { cite.num.names.full author make.name.cite.label + "}{%" write$ newline$ + cite.num.names.short author make.name.cite.label + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.author.cite.label} +{ author empty$ + { % + % No author: + % Use title or other description as citation label. + % + make.title.cite.label + "}{%" write$ newline$ + make.title.cite.label + } + { cite.num.names.full author make.name.cite.label + "}{%" write$ newline$ + cite.num.names.short author make.name.cite.label + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.definitive.year.supplement} +{ % + % Add "a", "b", etc. when necessary. + % + add.to.year #0 = + { "" } + { "{\protect " + year empty$ + { "\BCntND " * } + { year "\bibnodate" = + year "l" change.case$ "no date" = or + year "l" change.case$ "n.d." = or + { "\BCntND " * } + { year "\BIP" = + year "l" change.case$ "in press" = or + year "l" change.case$ "forthcoming" = or + { "\BCntIP " * } + { "\BCnt " * } + if$ + } + if$ + } + if$ + "{" * add.to.year int.to.str$ * "}}" * + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {protect.year} +{ year empty$ + { "{\protect \bibnodate {}}" } + { year "\bibnodate" = + year "l" change.case$ "no date" = or + year "l" change.case$ "n.d." = or + { "{\protect \bibnodate {}}" } + { year "\BIP" = + year "l" change.case$ "in press" = or + year "l" change.case$ "forthcoming" = or + { "{\protect \BIP {}}" } + { year } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.definitive.year.label} +{ "{\protect \APACyear {" + originalyear empty$ + { protect.year } + { originalyear "\bibnodate" = % date of original publication unknown + originalyear "l" change.case$ "no date" = or + originalyear "l" change.case$ "n.d." = or + { translator empty$ + { protect.year } + { "{\protect \BTRANSL {}}~" protect.year * } + if$ + } + { year empty$ + { originalyear "/{\protect \bibnodate {}}" * } % 1923/n.d. + { originalyear year = + { protect.year } + { originalyear "/" * protect.year * } % 1923/1961 + if$ + } + if$ + } + if$ + } + if$ + * "}}%" * write$ newline$ + % + % Add "a", "b", etc. when necessary. + % + "{\protect \APACexlab {" "}}" + make.definitive.year.supplement enclose.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {make.cite.labels} +{ newline$ + % + % Write a few lines for testing purposes. + % + test + { "\bibitem [] {} \fullciteA {" cite$ * "}" * write$ newline$ + "\bibitem [] {} \citeA {" cite$ * "}" * write$ newline$ + } + 'skip$ + if$ + % + "\bibitem [\protect \citeauthoryear {%" write$ newline$ + % + % When key or firstkey is available, this takes precedence. + % + firstkey empty$ not + { % + % Full cite: firstkey. + % + firstkey write$ + "}{%" write$ newline$ + % + % Short cite: if key is not empty and cite.initials is 0, + % then key, else firstkey. + % + cite.initials #0 = + key empty$ not + and + { key } + { firstkey } + if$ + write$ + } + { key empty$ not + { % + % No firstkey, but key available: + % Both full and short labels are key. + % + key write$ + "}{%" write$ newline$ + key write$ + } + { % No key or firstkey, so find out which field + % to use as author. + % + % Check reference type: + % if result is 1 then possibly editor acts as author + % 2 then editor does not act as author + % 3 then key should have been used + % 0 then unknown reference type + ref.type #2 = + { make.author.cite.label } + { make.author.editor.cite.label } + if$ + } + if$ + } + if$ + "}{%" write$ newline$ + % + % Make year label that's used for citations + % + make.definitive.year.label write$ + "}]{%" write$ newline$ + cite$ write$ + "} " write$ newline$ + % author.year.sort.label write$ newline$ % for testing purposes + % year.label write$ newline$ % for testing purposes + % + % If the item is used in a meta-analysis, indicate this with + % a star. + % + "\APACinsertmetastar {%" write$ newline$ + cite$ write$ + "}%" write$ newline$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {editor.postfix} +{ editor num.names$ #1 > + { "(\BEDS)" } + { "(\BED)" } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {editor.trans.postfix} +{ editor num.names$ #1 > + { "(\BEDS{} \BAnd{} \BTRANSS)" } + { "(\BED{} \BAnd{} \BTRANS)" } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % "(Trans.)" postfix + % translator must not be empty + % +FUNCTION {trans.postfix} +{ translator num.names$ #1 > + { "(\BTRANSS)" } + { "(\BTRANS)" } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {authors.editors.reflist.apa5} +{ 'field := + 'dot := + % + field num.names$ 'numnames := % numnames is the total number of names + % contained in field + numnames 'format.num.names := % Format all authors + format.num.names name.max > % Unless this exceeds the maximum of 6. + { dot + { name.max 'format.num.names := } % Format 6 authors + { cite.num.names.full 'format.num.names := } % Format 1 editor + if$ + } + 'skip$ + if$ + % + % Enclose authors in APACrefauthors environment to allow crude style + % options in \LaTeX. + "\begin{APACrefauthors}%" + write$ newline$ + % + % It is kind of explicit in the APA manual that if "et al." would + % refer to exactly one author (the 7th), then this author should + % still be replaced by "et al.", unlike with citations. + % So format.num.names is not adapted. + % + % Format first author + % + #1 'nameptr := + field nameptr format.author.name + % + % Add period if required and if this is the only author. + % + numnames #1 = + dot + and + { add.period$ } + 'skip$ + if$ + add.name.index % Add index entry when desired. + % + numnames #1 = + 'skip$ + { format.num.names #1 = + { % + % First author et al. + % + comma.between.two + % + % Add period if required. + % + dot + { et.al.string.period * } + { et.al.string * } + if$ + write$ + } + { numnames #2 = + { % + % Given that format.num.names > 1, it is 2. + % + comma.between.two write$ + % + % Format second author. + % + #2 'nameptr := + field nameptr format.author.name 's := + % + % Check if 2nd author is explicit "others". + % If so, insert "et al." string. + % + s "others" = + { % + % First et al. + % Add period if required. + % + dot + { et.al.string.period } + { et.al.string } + if$ + write$ + } + { % + % First \& Second + % + and.before.last write$ + % + % Add period if required. + % + dot + { s add.period$ } + { s } + if$ + add.name.index % Add index entry when desired. + } + if$ + } + { % + % 3 or more names, 2 or more must be cited + % + % for nameptr := 2 to format.num.names - 1 do + % + #2 'nameptr := + { nameptr format.num.names < } + { % + % Put comma between consecutive authors + % + comma.between.names write$ + % + % Format and add next author + % + field nameptr format.author.name + add.name.index % Add index entry when desired. + % + % Move to next author + % + nameptr #1 + 'nameptr := + } + while$ + % + % nameptr = format.num.names + % Format this author. + % + field nameptr format.author.name 's := + % + format.num.names numnames = + { % + % This is also the last author. Add (optional) comma. + % + comma.before.last write$ + % + % Check if this author is explicit "others". + % If so, insert "et al." string. + % + s "others" = + { % + % Add period if required. + % + dot + { et.al.string.period } + { et.al.string } + if$ + write$ + } + { and.before.last write$ + % + % Add period if required. + % + dot + { s add.period$ } + { s } + if$ + add.name.index % Add index entry when desired. + } + if$ + } + { % + % This is not the last author. + % Add comma, author name, and "et al." + % + comma.between.names write$ + s + add.name.index % Add index entry when desired. + % + comma.before.last + % + % Add period if required. + % + dot + { et.al.string.period * } + { et.al.string * } + if$ + write$ + } + if$ + } + if$ + } + if$ + } + if$ + % + % End APACrefauthors environment. + "\end{APACrefauthors}%" + write$ newline$ +} + +FUNCTION {authors.reflist.apa6} +{ 'field := + 'dot := + field num.names$ 'numnames := + numnames #7 > + { #7 'format.num.names := } + { numnames 'format.num.names := } + if$ + "\begin{APACrefauthors}%" + write$ newline$ + #1 'nameptr := + field nameptr format.author.name + numnames #1 = + { dot + { %add.period$ +} + 'skip$ + if$ + add.name.index + } + { add.name.index + numnames #2 = + { comma.between.two write$ + #2 'nameptr := + field nameptr format.author.name 's := + s "others" = + { "`others' not consistent with 6th ed. of the APA Manual" + warning$ + dot + { et.al.string.period } + { et.al.string } + if$ + write$ newline$ + } + { and.before.last write$ + dot + { s add.period$ } + { s } + if$ + add.name.index + } + if$ + } + { %% for nameptr := 2 to format.num.names - 1 do + #2 'nameptr := + { nameptr format.num.names < } + { comma.between.names write$ + field nameptr format.author.name + add.name.index + nameptr #1 + 'nameptr := + } + while$ + field numnames format.author.name 's := + format.num.names numnames = + { comma.before.last write$ + s "others" = + { "`others' not consistent with 6th ed. of the APA " + "Manual" * + warning$ + dot + { et.al.string.period } + { et.al.string } + if$ + write$ + } + { no.and.before.last write$ + dot + { s add.period$ } + { s } + if$ + add.name.index + } + if$ + } + { dots.before.last write$ + s + add.name.index + } + if$ + } + if$ + } + if$ + "\end{APACrefauthors}%" + write$ newline$ +} + +FUNCTION {format.author.names} +{ 'field := + 'dot := + dot + { dot field authors.reflist.apa6 } + { dot field authors.editors.reflist.apa5 } + if$ +} +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.authors} +{ #1 author format.author.names } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.editors.as.authors} +{ #0 editor format.author.names + "\ " editor.postfix * add.period$ write$ newline$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.ed.trans.as.authors} +{ #0 editor format.author.names + "\ " editor.trans.postfix * add.period$ write$ newline$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.editor.names} +{ 'field := + % + field num.names$ 'numnames := % numnames is the total number of names + % contained in field + numnames 'format.num.names := % Format all authors + format.num.names name.max > % Unless this exceeds the maximum of 6. + { #1 'format.num.names := } % Then it becomes 1 (First et al.) + 'skip$ + if$ + % + % Format first editor + % + field #1 format.editor.name + % + numnames #1 = + 'skip$ + { format.num.names #1 = + { et.al.string * } % First editor et al., no comma. + { numnames #2 = + { % + % Given that format.num.names > 1, it is 2. + % No comma. Format second editor. + % + field #2 format.editor.name 's := + % + % Check if 2nd editor is explicit "others". + % If so, insert "et al." string. + % + s "others" = + { et.al.string * } % First et al. + { and.before.last * s * } % First \& Second + if$ + } + { % + % 3 or more names, 2 or more must be cited + % + % for nameptr := 2 to format.num.names - 1 do + % + #2 'nameptr := + { nameptr format.num.names < } + { % + % Put comma between consecutive editors + % + comma.between.names * + % + % Format and add next editor + % + field nameptr format.editor.name * + % + % Move to next editor + % + nameptr #1 + 'nameptr := + } + while$ + % + % nameptr = format.num.names + % Format this editor. + % + field nameptr format.editor.name 's := + % + format.num.names numnames = + { % + % This is also the last editor. Add (optional) comma. + % + comma.before.last * + % + % Check if this editor is explicit "others". + % If so, insert "et al." string. + % + s "others" = + { et.al.string * } + { and.before.last * s * } + if$ + } + { % + % This is not the last editor. + % Add comma, editor name, and "et al." + % + comma.between.names * s * + comma.before.last * et.al.string * + } + if$ + } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format editors in case editors do not act as authors + % (such as reference to chapter in edited book) + % + % L. W. Poon (Ed.) (1 editor) + % or + % A. S. Gurman \& D. P. Kniskern (Eds.) (2 editors) + % or + % L. Poon, A. Jones, \& D. P. Smith (Eds.) (>2 editors) + % + % editor must not be empty + % +FUNCTION {format.editors.in.line} +{ editor format.editor.names + editor.postfix connect.with.space.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format editors in case editors are also translators + % and do not act as authors + % (such as reference to chapter in edited book + % of translated articles) + % + % L. W. Poon (Ed. and Trans.) (1 editor) + % or + % A. S. Gurman \& D. P. Kniskern (Eds. and Trans.) (2 editors) + % or + % L. Poon, A. Jones, \& D. P. Smith (Eds. and Trans.) (>2 editors) + % + % editor must not be empty + % +FUNCTION {format.editors.trans.in.line} +{ editor format.editor.names + editor.trans.postfix connect.with.space.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format translators in case translators act as editors + % (such as reference to chapter in translated book) + % + % L. W. Poon (Trans.) (1 translator) + % or + % A. S. Gurman \& D. P. Kniskern (Trans.) (2 translators) + % or + % L. Poon, A. Jones, \& D. P. Smith (Trans.) (>2 translators) + % + % translator must not be empty + % +FUNCTION {format.translators.in.line} +{ translator format.editor.names + trans.postfix connect.with.space.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format translators in case translator does not act as editor + % (such as reference to translated book) + % + % L. Solotaroff, Trans. + % +FUNCTION {format.translators.in.paren.check} +{ translator empty$ + { "" } + { translator format.editor.names + translator num.names$ #1 > + { ", \BTRANSS{}" * } + { ", \BTRANS{}" * } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format editors and translators in case neither act as editor + % (such as reference to edited or translated book with a + % a single author) + % + % L. Solotaroff, Ed. + % L. Solotaroff, Ed. \& Trans. + % L. Solotaroff, Trans. + % L. Solotaroff, Ed. \& S. Prokofieff, Trans. + % +FUNCTION {format.editors.translators.in.paren.check} +{ editor empty$ + { translator empty$ + { "" } + { translator format.editor.names + translator num.names$ #1 > + { ", \BTRANSS{}" * } + { ", \BTRANS{}" * } + if$ + } + if$ + } + { editor format.editor.names + editor num.names$ #1 > + { ", \BEDS{}" * } + { ", \BED{}" * } + if$ + translator empty$ + 'skip$ + { editor translator = + { editor num.names$ #1 > + { " \BAnd{} \BTRANSS" * } + { " \BAnd{} \BTRANS" * } + if$ + } + { " \BAnd{} " * + translator format.editor.names * + translator num.names$ #1 > + { ", \BTRANSS{}" * } + { ", \BTRANS{}" * } + if$ + } + if$ + } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % translator of article + % +FUNCTION {format.atrans.check} +{ format.translators.in.paren.check parenthesize.check } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format "In editor (Ed.), " + % +FUNCTION {format.in.editors} +{ "\BIn{} " + editor empty$ + 'skip$ + { format.editors.in.line * ", " * } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format "In translator (Trans.)," + % +FUNCTION {format.in.trans} +{ "\BIn{} " + translator empty$ + 'skip$ + { format.translators.in.line * ", " * } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format "In editor (Ed. and Trans.)" + % or "In editor (Ed.)" if editor not equal to translator + % +FUNCTION {format.in.editors.trans} +%{ "\BIn{} " Commented by SPI +{ " " + editor empty$ + { translator empty$ + 'skip$ + { format.translators.in.line * ", " * } + if$ + } + { translator empty$ + { format.editors.in.line * } + { editor translator = + { format.editors.trans.in.line * } + { format.editors.in.line * } + if$ + } + if$ + ", " * + } + if$ +} + +FUNCTION {in.format.in.editors.trans} +{ "\BIn{} " + editor empty$ + { translator empty$ + 'skip$ + { format.translators.in.line * ", " * } + if$ + } + { translator empty$ + { format.editors.in.line * } + { editor translator = + { format.editors.trans.in.line * } + { format.editors.in.line * } + if$ + } + if$ + ", " * + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.year.check} +{ "\APACrefYear{" + protect.year * + % + % Add "a", "b", etc. when necessary. + % + make.definitive.year.supplement * + "}" * +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +FUNCTION {format.year.month.day.check} +{ "\APACrefYearMonthDay{" + protect.year * + % + % Add "a", "b", etc. when necessary. + % + make.definitive.year.supplement * + "}{" * + % + % Add month and day when present. + % + month empty$ + 'skip$ + { month * } + if$ + "}{" * + day empty$ + 'skip$ + { day * } + if$ + "}" * +} +FUNCTION {format.year.nomonth.day.check} +{ "\APACrefYearMonthDay{" + protect.year * + % + % Add "a", "b", etc. when necessary. + % + make.definitive.year.supplement * + "}{" * + % + % Add month and day when present. + % + month empty$ + 'skip$ + { } + if$ + "}{" * + day empty$ + 'skip$ + { day * } + if$ + "}" * +} + +FUNCTION {format.atitle.no.dot} +{ "{\BBOQ}" swap$ + "{\BBCQ}" swap$ + duplicate$ empty$ + 'skip$ + { duplicate$ + % Two arguments: Title twice: (1) don't change case; (2) change case + "\APACrefatitle {" swap$ * "} {" * swap$ + "t" change.case$ + * "}" * + } + if$ + enclose.check +} + +FUNCTION {format.atitle.dot} +{ "{\BBOQ}" swap$ + "{\BBCQ}" swap$ + duplicate$ empty$ + 'skip$ + { duplicate$ + % Two arguments: Title twice: (1) don't change case; (2) change case + "\APACrefatitle {" swap$ * "} {" * swap$ + "t" change.case$ + * "}" * add.period$ + } + if$ + enclose.check +} + +FUNCTION {format.atitle.connect} +{ swap$ + duplicate$ empty$ + { pop$ + format.atitle.dot + } + { swap$ + format.atitle.no.dot + swap$ connect.with.space.check + add.period$ + } + if$ +} + +FUNCTION {format.btitle.no.dot} +{ duplicate$ empty$ + { pop$ + "" + } + { duplicate$ + % Two arguments: Title twice: (1) don't change case; (2) change case + "\APACrefbtitle {" swap$ * "} {" * swap$ + "t" change.case$ + * "}" * + } + if$ +} + +FUNCTION {format.btitle.dot} +{ duplicate$ empty$ + { pop$ + "" + } + { add.period$ format.btitle.no.dot } + if$ +} +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title of book and similar + % field must be on top of stack + % second element on stack must be connected: + % if that is empty, then btitle.dot + % else btitle.no.dot, connect, and add period + % +FUNCTION {format.btitle.connect} +{ swap$ + duplicate$ empty$ + { pop$ + format.btitle.dot + } + { swap$ + format.btitle.no.dot + swap$ connect.with.space.check + add.period$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title of book and similar + % field must be on top of stack + % second element on stack must be connected + % +FUNCTION {format.btitle.connect.no.dot} +{ swap$ + duplicate$ empty$ + { pop$ + format.btitle.no.dot + } + { swap$ + format.btitle.no.dot + swap$ connect.with.space.check + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format englishtitle (of nonenglish article, etc.) + % +FUNCTION {format.aetitle.check} +{ englishtitle empty$ + { "" } + { % Two arguments: Title twice: (1) don't change case; (2) change case + "\APACrefaetitle {" englishtitle * "} {" * + englishtitle "t" change.case$ * "}" * + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format englishtitle (of nonenglish book, etc.) + % +FUNCTION {format.betitle.check} +{ englishtitle empty$ + { "" } + { % Two arguments: Title twice: (1) don't change case; (2) change case + "\APACrefbetitle {" englishtitle * "} {" * + englishtitle "t" change.case$ * "}" * + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format type (of article, etc.) + % +FUNCTION {format.atype.check} +{ type bracket.check } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format title and englishtitle (of article, etc.) + % +FUNCTION {format.atitle.check} +{ format.aetitle.check + title format.atitle.connect +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format title, englishtitle, and type + % (of article, etc.) + % +FUNCTION {format.atitle.type.check} +{ format.aetitle.check + format.atype.check connect.with.space.check + title format.atitle.connect +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format title, englishtitle, + % and translator (of article, etc.) + % +FUNCTION {format.atitle.trans.check} +{ format.aetitle.check + format.atrans.check connect.with.space.check + title format.atitle.connect +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format title, englishtitle, type, + % and translator (of article, etc.) + % +FUNCTION {format.atitle.type.trans.check} +{ format.aetitle.check + format.atype.check connect.with.space.check + format.atrans.check connect.with.space.check + title format.atitle.connect +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format journal, volume, number and pages + % call with + % formatted.pages format.journal.vol.num.pages.check + % +FUNCTION { format.journal.vol.num.pages.check } +{ "journal" journal warning.if.empty + duplicate$ empty$ + journal empty$ and + volume empty$ and + number empty$ and + { pop$ "" } + { "\APACjournalVolNumPages{" journal "" connect.check + "}{" * volume "" connect.check + "}{" * number "" connect.check + "}{" * swap$ "" connect.check + ",}" * + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % volume of book, checks whether + % "Volume" or "Volumes" + % + % call with + % field format.bvolume.check + % +FUNCTION {format.bvolume.check} +{ duplicate$ empty$ + 'skip$ + { duplicate$ multi.result.check + { "\BVOLS" swap$ tie.or.space.connect } + { "\BVOL" swap$ tie.or.space.connect } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % edition of book, must not be empty + % call with + % field format.edition.check + % +FUNCTION {format.edition.check} +{ duplicate$ empty$ + 'skip$ + { "\PrintOrdinal{" swap$ * "}" * + "\BEd" connect.with.space.check + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % volume and edition of book + % +FUNCTION {format.bvol.edition.check} +{ edition format.edition.check + volume format.bvolume.check + connect.with.comma.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % volume and edition of book + % +FUNCTION {format.bvol.edition} +{ format.bvol.edition.check + parenthesize.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % volume and edition and translator of translated book + % +FUNCTION {format.bvol.edition.trans} +{ format.bvol.edition.check + format.translators.in.paren.check connect.with.semicolon.check + parenthesize.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % volume, edition, editor, and translator of (translated) book + % +FUNCTION {format.bvol.edition.editor.trans} +{ format.bvol.edition.check + format.editors.translators.in.paren.check connect.with.semicolon.check + parenthesize.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % formats pages by first checking if 1 or more pages + % and prefixing pages with "p." or "pp." (these strings + % are given in the commands \BPG and \BPGS, respectively), + % whichever is applicable, and do a tie or space connect + % + % call with + % field format.bpages.check + % +FUNCTION {format.bpages.check} +{ duplicate$ empty$ + 'skip$ + { duplicate$ multi.result.check + { "\BPGS" swap$ tie.or.space.connect } + { "\BPG~" swap$ * } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % formats chapters by first checking if 1 or more chapters + % and prefixing pages with "chap." (this string + % is given in the commands \BCHAP and \BCHAPS, respectively), + % whichever is applicable, and do a tie or space connect + % + % call with + % field format.bchapter.check + % +FUNCTION {format.bchapter.check} +{ duplicate$ empty$ + 'skip$ + { duplicate$ multi.result.check + { "\BCHAPS" swap$ tie.or.space.connect } + { "\BCHAP" swap$ tie.or.space.connect } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % volume, edition, and pages or chapter of article in book etc. + % +FUNCTION {format.bvol.edition.pages} +{ format.bvol.edition.check + pages empty$ + { chapter format.bchapter.check connect.with.comma.check } + { pages format.bpages.check connect.with.comma.check } + if$ + parenthesize.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title, volume, edition of book + % +FUNCTION {format.btitle.vol.edition} +{ format.betitle.check + format.bvol.edition connect.with.space.check + title format.btitle.connect.no.dot +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title, volume, edition, and translator of book + % +FUNCTION {format.btitle.vol.edition.trans} +{ format.betitle.check + format.bvol.edition.trans connect.with.space.check + title format.btitle.connect.no.dot +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title, volume, edition, editor, and translator of book + % +FUNCTION {format.btitle.vol.edition.editor.trans} +{ format.betitle.check + format.bvol.edition.editor.trans connect.with.space.check + title format.btitle.connect.no.dot +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format address and publisher of book etc. + % + % New York: Wiley + % or + % Wiley (if address empty) + % or + % New York (if publisher empty) + % +FUNCTION {format.address.publisher} +{ % + % If publisher = author or publisher = "author" or publisher = "Author" + % then hand over the final choice how to format this to \LaTeX. + % (I could imagine similar code for editors, but the APA manual does + % not mention it and then we'd have to check whether the editor is in + % the author position, so let's keep it simple until someone complains.) + % + author empty$ + publisher empty$ or + { publisher "\APACaddressPublisher{" } + { author publisher = + "author" publisher = or + "Author" publisher = or + { author "\APACaddressPublisherEqAuth{" } + { publisher "\APACaddressPublisher{" } + if$ + } + if$ + address "" connect.check "}{" * + % Recover publisher that was pushed onto the stack previously. + swap$ "" connect.check "}" * +} + +FUNCTION {format.address.publisher.check} +{ publisher empty$ + address empty$ + and + 'skip$ + { + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.address.publisher + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format number as in reports: No. 2017 + % call with + % field format.rnumber.check + % +FUNCTION {format.rnumber.check} +{ duplicate$ empty$ + 'skip$ + { duplicate$ multi.result.check + { "\BNUMS" swap$ tie.or.space.connect } + { "\BNUM" swap$ tie.or.space.connect } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format type and number of a standalone item + % call with + % format.type.number + % +FUNCTION { format.type.number } +{ type empty$ + { type.2 } + { type } + if$ + number empty$ + { bracket.check } + { number format.rnumber.check connect.with.space.check + parenthesize.check + } + if$ +} + +FUNCTION {format.howpublished} +{ howpublished empty$ + 'skip$ + { % clear the stack + duplicate$ empty$ + 'pop$ + { output.dot.new.block } + if$ + "\APAChowpublished {" howpublished * "}" * + } + if$ +} +FUNCTION {output.howpublished} +{ howpublished empty$ + 'skip$ + { "\APAChowpublished {" howpublished * "}" * + output.dot.new.block + } + if$ +} +FUNCTION {howpublished.block} +{ howpublished empty$ + 'skip$ + { start.new.block + "\APAChowpublished {" howpublished * "}" * + output.dot.end.block + } + if$ +} +FUNCTION {begin.end.url.env} +{ "\begin{APACrefURL} " + lastchecked empty$ + { urldate empty$ + 'skip$ + { "[{" * urldate * "}]" * } + if$ + } + { "[{" * lastchecked * "}]" * } + if$ + " \end{APACrefURL} " +} + +FUNCTION {begin.end.doi.env} +{ "\begin{APACrefDOI} " + " \end{APACrefDOI} " +} + +FUNCTION {begin.end.msg.env} +{ "\begin{APACrefURLmsg} " + " \end{APACrefURLmsg} " +} +FUNCTION {format.url} +{ type.2 empty$ + { begin.end.url.env } + { type.2 "\bibmessage" = + { begin.end.msg.env } + { begin.end.url.env } + if$ + } + if$ +%%"\url{" url * "}" * + "{" url * "}" * + enclose.check +} +FUNCTION {url.block} +{ doi empty$ + { url empty$ + 'skip$ + { start.new.block + format.url + output.end.block + } + if$ + } + 'skip$ + if$ +} +FUNCTION {format.doi} +{ begin.end.doi.env + "\doi{" doi * "}" * + enclose.check +} +FUNCTION {doi.block} +{ doi empty$ + 'skip$ + { start.new.block + format.doi + output.end.block + } + if$ +} +FUNCTION {format.note} +{ "\APACrefnote{" "}" note enclose.check } +FUNCTION {note.block} +{ note empty$ + 'skip$ + { start.new.block + format.note + output.end.block + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format original year of publication and note + % (reprint or translation) + % +FUNCTION {format.orig.year.note} +{ originalyear empty$ + { format.note } + { "\APACorigyearnote{" + originalyear "" connect.check "}{" * + note "" connect.check "}" * + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format original journal of publication and note + % (reprint or translation) + % +FUNCTION {format.orig.journal.note} +{ "\APACorigjournalnote{" + originalyear "" connect.check "}{" * + originaljournal "" connect.check "}{" * + originalvolume "" connect.check "}{" * + originalnumber "" connect.check "}{" * + originalpages "" connect.check "}{" * + note "" connect.check "}" * +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format original book of publication and note + % (reprint or translation) + % +FUNCTION {format.orig.book.note} +{ "\APACorigbooknote{" originalyear "" connect.check "}{" * + % + originaleditor empty$ + 'skip$ + { originaleditor num.names$ #1 > + { "\APACorigEDS {" * originaleditor format.editor.names * "}" * } + { "\APACorigED {" * originaleditor format.editor.names * "}" * } + if$ + } + if$ + % + "}{" * + originalbooktitle format.btitle.no.dot "" connect.check "} {" * + originaledition format.edition.check "" connect.check "} {" * + originalvolume format.bvolume.check "" connect.check "} {" * + originalpages format.bpages.check "" connect.check "} {" * + originaladdress "" connect.check "} {" * + originalpublisher "" connect.check "} {" * + note "" connect.check "}" * +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format information about original publication of reprint + % and format optional note + % +FUNCTION {format.orig.note} +{ originaljournal empty$ + { originalbooktitle empty$ + { note empty$ + { originalyear empty$ + 'skip$ + { originalyear "\bibnodate" = + originalyear "l" change.case$ "no date" = or + originalyear "l" change.case$ "n.d." = or + 'skip$ + { output.new.block + format.orig.year.note + } + if$ + } + if$ + } + { output.new.block + format.orig.year.note + } + if$ + } + { output.new.block + format.orig.book.note + } + if$ + } + { output.new.block + format.orig.journal.note + } + if$ +} +FUNCTION {fin.entry} +{ %doi empty$ + % 'skip$ + % { output.new.block + % format.doi + % } + % if$ + output.end.block + "\PrintBackRefs{\CurrentBib}" write$ newline$ + test + { "\vspace{\baselineskip}" write$ newline$ } + 'skip$ + if$ +} +FUNCTION {fin.entry.2} +{ doi.block + "\PrintBackRefs{\CurrentBib}" write$ newline$ + test + { "\vspace{\baselineskip}" write$ newline$ } + 'skip$ + if$ +} + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { " {[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + { "{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {periodical} +{ + author empty$ + % + % no author: possibly special issue with editors as authors + % (APA manual, ex. 11, p. 121) + % + { editor empty$ + % + % no author or editor: title serves as author. + % title formatted as article title (APA manual not consistent in this, + % compare statement on p. 119: ``treat as book title'' and + % example 8, p. 121: no underlining => article title) + % + { format.atitle.type.trans.check output.new.block + % + % now formatted date on top of stack + % + output.dot.new.block + } + % + % format editor and year, and check if year is present + % format article title and check if title or type present + % + { format.editors.as.authors start.new.block + % + % now formatted date on top of stack + % + output.dot.new.block + format.atitle.type.trans.check output.new.block + } + if$ + } + % + % format author and year, and check if year is present + % format article title and check if title or type present + % + { format.authors start.new.block + % + % now formatted date on top of stack + % + output.dot.new.block + format.atitle.type.trans.check output.new.block + } + if$ + % + % format journal name, volume and issue number, and pages + % and check if journal not empty + % + format.journal.vol.num.pages.check +% output.new.block + doi empty$ + 'skip$ + { output.new.block + format.doi + } + if$ + % + % if not empty, insert howpublished. + % (used if article is retrieved from the internet) + % +% format.howpublished add.period$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % possible reprint and optional note + % + format.orig.note + output.new.block + format.eprint + output.new.block + format.primaryClass + fin.entry + } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % journal article + % +FUNCTION {article} +{ pages format.year.month.day.check periodical } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % magazine article + % +FUNCTION {magazine} +{ pages format.year.month.day.check periodical } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % newspaper article + % +FUNCTION {newspaper} +{ pages format.bpages.check format.year.month.day.check periodical } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % (translation of) entire book + % +FUNCTION {book} +{ % + % author or editor, + % year, title, englishtitle, translator + % + author empty$ + % + % no author: possibly edited book with editors as authors + % + { editor empty$ + % + % no author or editor: title serves as author. + % title formatted as book title + % + { format.btitle.vol.edition.trans + format.type.number connect.with.space.check + output.dot.new.block + format.year.check add.period$ + } + % + % format editor and year, and check if year is present + % format booktitle, volume, and edition and check if title present + % + { translator empty$ + { format.editors.as.authors start.new.block + format.year.check output.dot.new.block + format.btitle.vol.edition + } + % + % format translator correctly + % + { translator editor = + not + { format.editors.as.authors start.new.block + format.year.check output.dot.new.block + format.btitle.vol.edition.trans + } + { format.ed.trans.as.authors start.new.block + format.year.check output.dot.new.block + format.btitle.vol.edition + } + if$ + } + if$ + format.type.number connect.with.space.check + add.period$ + } + if$ + } + % + % format author and year, and check if year is present + % format booktitle, volume, and edition and check if title present + % + { format.authors start.new.block + format.year.check output.dot.new.block + format.btitle.vol.edition.editor.trans + format.type.number connect.with.space.check + add.period$ + } + if$ + % + % format address and publisher + % + format.address.publisher.check + % + % if not empty, insert howpublished. + % (used if book is retrieved from the internet) + % + format.howpublished add.period$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % format original publication (of reprint/translation) + % and optional note + % + format.orig.note + fin.entry +} +FUNCTION {incollection} +{ author empty$ + { editor.ne.trans + { format.atitle.type.trans.check } + { format.atitle.type.check } + if$ + output.new.block + format.year.month.day.check add.period$ + } + { format.authors start.new.block + format.year.month.day.check output.dot.new.block + editor.ne.trans + { format.atitle.type.trans.check } + { format.atitle.type.check } + if$ + } + if$ + editor empty$ + translator empty$ and + edition empty$ and + volume empty$ and + pages empty$ and + chapter empty$ and + booktitle empty$ and + 'skip$ + { + output.new.block + format.in.editors.trans + format.bvol.edition.pages + booktitle format.btitle.connect * add.period$ + } + if$ + format.address.publisher.check + format.howpublished add.period$ + url empty$ + 'skip$ + { + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + format.orig.note + fin.entry +} + +FUNCTION {inbookcollection} +{ author empty$ + { editor.ne.trans + { format.atitle.type.trans.check } + { format.atitle.type.check } + if$ + output.new.block + format.year.month.day.check add.period$ + } + { format.authors start.new.block + format.year.month.day.check output.dot.new.block + editor.ne.trans + { format.atitle.type.trans.check } + { format.atitle.type.check } + if$ + } + if$ + editor empty$ + translator empty$ and + edition empty$ and + volume empty$ and + pages empty$ and + chapter empty$ and + booktitle empty$ and + 'skip$ + { + output.new.block + in.format.in.editors.trans + format.bvol.edition.pages + booktitle format.btitle.connect * add.period$ + } + if$ + format.address.publisher.check + format.howpublished add.period$ + url empty$ + 'skip$ + { + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + format.orig.note + fin.entry +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % technical report number + % +FUNCTION {format.tr.number} +{ type empty$ + { "\BTR{}" } + { type "\bibnotype" = + { "" } + { type } + if$ + } + if$ + number format.rnumber.check connect.with.space.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title, volume, edition, report number + % +FUNCTION {format.tr.title.number} +{ format.betitle.check + % Single out the situation in which there is no number + % and type = {\bibnotype}, i.e., no type as well. + % (Why not use book then?) + type empty$ + { % Now, we're in the regular situation with at least a + % number, a type, a volume, or an edition. + "\APACbVolEdTR{" format.bvol.edition.check * "}{" * + format.tr.number * "}" * + } + { type "\bibnotype" = + number empty$ + volume empty$ + edition empty$ + and + and + and + { "" } + { % Now, we're in the regular situation with at least a + % number, a type, a volume, or an edition. + "\APACbVolEdTR {" format.bvol.edition.check * "}{" * + format.tr.number * "}" * + } + if$ + } + if$ + connect.with.space.check + title format.btitle.connect +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % format address and institution of reports etc. + % + % Washington, DC: National Institute of Education + % or + % National Institute of Education (if address empty) + % + % warning if no institution + % +FUNCTION {format.address.institution.check} +{ url empty$ + doi empty$ and + { "institution" institution warning.if.empty + "address" address warning.if.empty + } + 'skip$ + if$ + institution empty$ + address empty$ + and + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + % + % If institution = author or institution = "author" + % or institution = "Author" then hand over the final choice how to + % format this to \LaTeX. See also format.address.publisher + % + author empty$ + institution empty$ or + { institution "\APACaddressInstitution{" } + { author institution = + "author" institution = or + "Author" institution = or + { author "\APACaddressInstitutionEqAuth{" } + { institution "\APACaddressInstitution{" } + if$ + } + if$ + address "" connect.check "}{" * + % Recover institution that was pushed onto the stack previously. + swap$ "" connect.check "}" * + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % reports + % +FUNCTION {techreport} +{ author empty$ + % + % no author: possibly edited report with editors as authors + % + { editor empty$ + % + % no author or editor: title serves as author. + % title formatted as book title + % + { format.tr.title.number output.dot.new.block + format.year.month.day.check add.period$ + } + % + % format editor and year, and check if year is present + % format report title and check if title present + % format volume, edition, type, and number + % + { format.editors.as.authors start.new.block + format.year.month.day.check output.dot.new.block + format.tr.title.number add.period$ + } + if$ + } + % + % format author and year, and check if year is present + % format report title and check if title present + % format volume, edition, type, and number + % + { format.authors start.new.block + format.year.month.day.check output.dot.new.block + format.tr.title.number add.period$ + } + if$ + % + % format address and institution, check if institution present + % + format.address.institution.check + % + % if not empty, insert howpublished. + % (used if report is retrieved from the internet) + % + format.howpublished add.period$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % format optional note + % + note empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.note + } + if$ + fin.entry +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % (translated) article or chapter in report + % +FUNCTION {intechreport} +{ author empty$ + % + % no author: title serves as author. + % title formatted as article title (APA manual not consistent in this, + % compare statement on p. 119: ``treat as book title'' and + % example 8, p. 121: no underlining => article title) + % + { editor.ne.trans + { format.atitle.trans.check } + { format.atitle.check } + if$ + output.new.block + format.year.month.day.check output.dot.new.block + } + % + % format author and year, and check if year is present + % format article title and check if title or type present + % + { format.authors start.new.block + format.year.month.day.check output.dot.new.block + editor.ne.trans + { format.atitle.trans.check } + { format.atitle.check } + if$ + output.new.block + } + if$ + % + % format "In " editor " (Ed. \& Trans.), " + % booktitle, volume, edition, pages + % + format.in.editors.trans + % + % volume, edition, report type and number, pages + % + "\APACbVolEdTRpgs {" format.bvol.edition.check * "} {" * + format.tr.number * + "} {" * pages format.bpages.check * + "}" * + % + booktitle format.btitle.connect * + add.period$ + % + % format address and publisher + % + format.address.institution.check + % + % if not empty, insert howpublished. + % (used if report is retrieved from the internet) + % + format.howpublished add.period$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % format original publication (of reprint/translation) + % and optional note + % + format.orig.note + fin.entry +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % papers presented at conferences etc. + % +FUNCTION {lecture} +{ author empty$ + { "author" author warning.if.empty } + { format.authors start.new.block } + if$ + % + % format year, month, and day, and check if year present + % format title and check if title present + % format howpublished and check if howpublished present + % + format.year.month.day.check output.dot.new.block + symposium empty$ + { format.betitle.check + title format.btitle.connect output.new.block + howpublished empty$ + { "symposium and howpublished missing in " cite$ * warning$ + "" + } + { "\APAChowpublished {" howpublished * "}" * } + if$ + address connect.with.comma.check + } + { format.atitle.type.check output.new.block + "\BIn{} " + chair empty$ + 'skip$ + { chair format.editor.names + chair num.names$ #1 > + { "(\BCHAIRS)" } + { "(\BCHAIR)" } + if$ + connect.with.space.check * ", " * + } + if$ + symposium format.btitle.no.dot * + format.howpublished + address connect.with.comma.check + } + if$ + add.period$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % format optional note + % + note empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.note + } + if$ + fin.entry +} + +FUNCTION {format.ttitle.type.school} +{ doi empty$ not + url empty$ not or + howpublished empty$ not or + { pop$ } + { swap$ pop$ } + if$ + type empty$ + 'skip$ + { type "\bibnotype" = + { pop$ + "" + } + { pop$ + type + } + if$ + } + if$ + duplicate$ empty$ + doi empty$ + url empty$ and + howpublished empty$ and + address empty$ + school empty$ and or and + { 'pop$ + title empty$ not + englishtitle empty$ not or + { start.new.block } + 'skip$ + if$ + "" + } + { start.new.block + "\APACtypeAddressSchool {" swap$ * "}{" * + doi empty$ + url empty$ and + howpublished empty$ and + { "}{}" * } + { address "" connect.check "}{" * + school "" connect.check "}" * + } + if$ + } + if$ + format.betitle.check swap$ + connect.with.space.check + "title" title warning.if.empty + title format.btitle.connect +} +FUNCTION {unpub.address.school.block} +{ doi empty$ + url empty$ and + howpublished empty$ and + { "school" school warning.if.empty + school empty$ + address empty$ and + 'skip$ + { start.new.block + "\APACaddressSchool {" address "" connect.check "}{" * + school "" connect.check "}" * + output.dot.end.block + } + if$ + } + 'skip$ + if$ +} +FUNCTION {thesis} +{ journal empty$ not + { pop$ pop$ + article + } + { author empty$ + { "author" author warning.if.empty } + { format.authors start.new.block } + if$ + format.year.check output.dot.end.block + format.ttitle.type.school output.dot.end.block + unpub.address.school.block + howpublished.block + url.block + note.block + fin.entry.2 + } + if$ +} +FUNCTION {phdthesis} +{ "\BPhD" "\BUPhD" thesis } +FUNCTION {mastersthesis} +{ "\BMTh" "\BUMTh" thesis } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title of something (used in unpublished and misc) + % english translation of title + % type and number of something + % +FUNCTION {format.btitle.type.num} +{ format.betitle.check + format.bvol.edition connect.with.space.check + format.type.number + connect.with.space.check + title empty$ + { add.period$ } + { title format.btitle.connect } + if$ +} + +FUNCTION {format.version} +{ + version empty$ + { "" } + { " " * version *} + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title of message or software-related thing (used in misc) + % english translation of title + % type and number of something + % +FUNCTION {format.mtitle.type.num} +{ format.aetitle.check + format.bvol.edition connect.with.space.check + type.2 "\bibmessage" = + { number empty$ + 'skip$ + { type.2 number tie.or.space.connect + bracket.check + connect.with.space.check + } + if$ + } + { format.type.number + connect.with.space.check + } + if$ + title empty$ + { add.period$ } + { title format.atitle.connect } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % title, english translation of title, + % type and number of something (used in misc) + % +FUNCTION {output.misctitle.type.num} +{ type.2 empty$ + { format.btitle.type.num } + { type.2 "\bibmessage" = + type.2 "\bibcomputerprogram" = or + type.2 "\bibcomputerprogrammanual" = or + type.2 "\bibcomputerprogramandmanual" = or + type.2 "\bibcomputersoftware" = or + type.2 "\bibcomputersoftwaremanual" = or + type.2 "\bibcomputersoftwareandmanual" = or + type.2 "\bibprogramminglanguage" = or + { format.mtitle.type.num } + { format.btitle.type.num } + if$ + } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % unpublished manuscripts, etc. + % +FUNCTION {unpublished} +{ check.relevant.fields + author empty$ + % + % no author: possibly edited book with editors as authors + % + { editor empty$ + % + % no author or editor: title serves as author. + % title formatted as book title + % + { format.btitle.type.num output.new.block + format.year.month.day.check add.period$ + } + % + % format editor and year, and check if year is present + % format book title, volume, and edition and check if title present + % + { format.editors.as.authors start.new.block + format.year.month.day.check output.dot.new.block + format.btitle.type.num + } + if$ + } + % + % format author and year, and check if year is present + % format book title, volume, and edition + % and check if title or type present + % + { format.authors start.new.block + format.year.month.day.check output.dot.new.block + format.btitle.type.num + } + if$ + howpublished empty$ + organization empty$ and + address empty$ and + 'skip$ + { output.new.block + "\APAChowpublished{" "}" howpublished enclose.check + organization connect.with.comma.check + address connect.with.comma.check + add.period$ + } + if$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % format optional note + % + note empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.note + } + if$ + fin.entry +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % nonprint media and other things that don't fit + % +FUNCTION {misc} +{ % + % To handle @manual: use type.2 instead of type. + type.2 empty$ + type empty$ not and + { type 'type.2 := } + 'skip$ + if$ + % + author empty$ + % + % no author: possibly edited item with editors as authors + % + { editor empty$ + % + % no author or editor: title/type serves as author. + % title formatted as book title + % + % if no title and no type, howpublished is title + % + { title empty$ + type.2 empty$ and + { howpublished empty$ + { "No author, editor, title, type, and howpublished in " + cite$ * warning$ + "" + } + { "\APAChowpublished{" howpublished * "}" * add.period$ } + if$ + format.year.month.day.check add.period$ + } + { output.misctitle.type.num %output.new.block + format.year.month.day.check add.period$ + format.howpublished add.period$ + } + if$ + } + % + % format editor and year, and check if year is present + % format book title, volume, and edition and check if title present + % + { format.editors.as.authors start.new.block + format.year.month.day.check output.dot.new.block + output.misctitle.type.num output.dot.new.block + format.howpublished add.period$ + } + if$ + } + % + % format author and year, and check if year is present + % format book title, volume, and edition + % and check if title or type present + % + { format.authors start.new.block + format.year.month.day.check output.dot.new.block + output.misctitle.type.num + format.howpublished add.period$ + } + if$ + % + address empty$ + publisher empty$ and + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.address.publisher add.period$ + } + if$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % format optional note + % + note empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.note + } + if$ + fin.entry +} + +FUNCTION {softmisc} +{ % + % To handle @manual: use type.2 instead of type. + type.2 empty$ + type empty$ not and + { type 'type.2 := } + 'skip$ + if$ + % + author empty$ + % + % no author: possibly edited item with editors as authors + % + { editor empty$ + % + % no author or editor: title/type serves as author. + % title formatted as book title + % + % if no title and no type, howpublished is title + % + { title empty$ + type.2 empty$ and + { howpublished empty$ + { "No author, editor, title, type, and howpublished in " + cite$ * warning$ + "" + } + { "\APAChowpublished{" howpublished * "}" * add.period$ } + if$ + format.year.month.day.check add.period$ + } + { output.misctitle.type.num %output.new.block + format.year.month.day.check add.period$ + format.howpublished add.period$ + } + if$ + } + % + % format editor and year, and check if year is present + % format book title, volume, and edition and check if title present + % + { format.editors.as.authors start.new.block + format.year.month.day.check output.dot.new.block + output.misctitle.type.num output.dot.new.block + format.howpublished add.period$ + } + if$ + } + % + % format author and year, and check if year is present + % format book title, volume, and edition + % and check if title or type present + % + { format.authors start.new.block + format.year.nomonth.day.check output.dot.new.block + output.misctitle.type.num + format.version + format.howpublished add.period$ + } + if$ + % + address empty$ + publisher empty$ and + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.address.publisher add.period$ + } + if$ + % + % format url + % + url empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.url + } + if$ + % + % format optional note + % + note empty$ + 'skip$ + { % Clear the stack + duplicate$ empty$ + 'skip$ + { output.new.block } + if$ + format.note + } + if$ + output.dot.new.block + format.softmisc.eprint + fin.entry +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % for legal cases and other cases that need to be + % done by hand + % +FUNCTION {literal} +{ "key" key warning.if.empty + "text" text warning.if.empty + text empty$ + { "" } + { text } + if$ + fin.entry +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % technical documentation + % +FUNCTION {manual} +{ % + % If type is empty, assume that it is a computer software manual. + % + type empty$ + { "\bibcomputersoftwaremanual" 'type.2 := } + 'skip$ + if$ + misc +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % booklet + % +FUNCTION {booklet} +{ misc } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % part of a book + % +FUNCTION {inbook} +{ inbookcollection } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % article in proceedings + % +FUNCTION {inproceedings} +{ incollection } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % article in proceedings (Kopka & Daly, 2004, p. 230) + % +FUNCTION {conference} +{ inproceedings } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % proceedings + % +FUNCTION {proceedings} +{ misc } + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % unknown types + % +FUNCTION {default.type} +{ misc } + +FUNCTION {initialize} +{ + #6 'name.max := +%% #250 'entry.max$ := +%% #5000 'global.max$ := +} +FUNCTION {init.old.number} +{ #0 'old.number := } +FUNCTION {init.old.label} +{ "zzzzzz" 'old.label := } +FUNCTION {init.cite.initials.add.to.year} +{ #0 'cite.initials := + #0 'add.to.year := +} +FUNCTION {move.forward} +{ #1 'forward := } +FUNCTION {move.backward} +{ #0 'forward := } +FUNCTION {begin.bib} +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + "\begin{thebibliography}{}" write$ newline$ + "\renewcommand{\doi}[1]{\url{https://doi.org/#1}}" + write$ newline$ + "\bibcommenthead" write$ newline$ +} +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} +FUNCTION {write.bbl.entry} +{ + make.cite.labels + call.type$ +} +READ +EXECUTE { identify.apacite.version } +EXECUTE { initialize } +EXECUTE { init.old.number } +ITERATE { make.citeorder.number } +ITERATE { make.sort.title } +SORT +EXECUTE { init.old.number } +EXECUTE { init.old.label } +ITERATE { make.title.number } +ITERATE { make.tentative.sort.label } +SORT +ITERATE { init.cite.initials.add.to.year } +EXECUTE { init.initials } +ITERATE { check.add.initials } +EXECUTE { init.initials } +REVERSE { check.add.initials } +ITERATE { tentative.cite.num.names } +EXECUTE { init.cite.num.names } +EXECUTE { move.forward } +ITERATE { definitive.cite.num.names } +EXECUTE { init.cite.num.names } +EXECUTE { move.backward } +REVERSE { definitive.cite.num.names } +ITERATE { make.final.sort.key } +SORT +EXECUTE { begin.bib } +ITERATE { write.bbl.entry } +EXECUTE { end.bib } + +%% +%% End of file `apacite.bst'. diff --git a/inst/rmarkdown/templates/springer/skeleton/spphys.bst b/inst/rmarkdown/templates/springer/skeleton/sn-aps.bst similarity index 93% rename from inst/rmarkdown/templates/springer/skeleton/spphys.bst rename to inst/rmarkdown/templates/springer/skeleton/sn-aps.bst index 5cfce9d75..4cc13dda7 100644 --- a/inst/rmarkdown/templates/springer/skeleton/spphys.bst +++ b/inst/rmarkdown/templates/springer/skeleton/sn-aps.bst @@ -55,6 +55,7 @@ ENTRY institution journal key + keywords month note number @@ -68,6 +69,13 @@ ENTRY url volume year + eprint + archive + archivePrefix + primaryClass + adsurl + adsnote + version } {} { label } @@ -580,7 +588,7 @@ FUNCTION {n.separate} } FUNCTION {n.dashify} { - n.separate +%% n.separate 't := "" { t empty$ not } @@ -804,7 +812,7 @@ FUNCTION {format.journal.pages} { ", " * swap$ - first.page + n.dashify "pages" bibinfo.check * } @@ -1056,11 +1064,62 @@ FUNCTION {format.organization.address} { organization "organization" bibinfo.check format.org.or.pub } +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { "{[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + FUNCTION {article} { output.bibitem format.authors "author" output.check add.comma format.title "title" output.check + new.block crossref missing$ { journal @@ -1079,8 +1138,13 @@ FUNCTION {article} format.url output new.block format.note output + new.block + format.eprint output + add.blank + format.primaryClass output fin.entry } + FUNCTION {book} { output.bibitem author empty$ @@ -1102,6 +1166,7 @@ FUNCTION {book} format.number.series output new.sentence format.publisher.address output + format.pages output } { new.block @@ -1208,7 +1273,6 @@ FUNCTION {inproceedings} format.publisher.address output } if$ - format.bvolume output format.number.series output format.pages output } @@ -1298,6 +1362,27 @@ FUNCTION {misc} fin.entry empty.misc.check } + +FUNCTION {softmisc} +{ output.bibitem + format.authors output + title howpublished new.block.checkb + format.title output + version output + howpublished new.block.checka + howpublished "howpublished" bibinfo.check output + format.date output + format.doi output + new.block + format.url output + new.block + format.note output + new.block + format.softmisc.eprint output + fin.entry + empty.misc.check +} + FUNCTION {phdthesis} { output.bibitem format.authors "author" output.check @@ -1422,12 +1507,14 @@ FUNCTION {begin.bib} write$ newline$ "\providecommand{\urlprefix}{URL }" write$ newline$ - "\expandafter\ifx\csname urlstyle\endcsname\relax" - write$ newline$ - " \providecommand{\doi}[1]{DOI \discretionary{}{}{}#1}\else" - write$ newline$ - " \providecommand{\doi}{DOI \discretionary{}{}{}\begingroup \urlstyle{rm}\Url}\fi" + %%"\expandafter\ifx\csname urlstyle\endcsname\relax" + %% write$ newline$ + %%" \providecommand{\doi}[1]{\discretionary{}{}{}#1}\else" + %%write$ newline$ + %%" \providecommand{\doi}{\discretionary{}{}{}\begingroup \urlstyle{rm}\Url}\fi" + "\providecommand{\doi}[1]{\url{https://doi.org/#1}}" write$ newline$ + "\bibcommenthead" write$ newline$ } EXECUTE {begin.bib} EXECUTE {init.state.consts} diff --git a/inst/rmarkdown/templates/springer/skeleton/spbasic.bst b/inst/rmarkdown/templates/springer/skeleton/sn-basic.bst similarity index 91% rename from inst/rmarkdown/templates/springer/skeleton/spbasic.bst rename to inst/rmarkdown/templates/springer/skeleton/sn-basic.bst index fe56f57c0..5072a4d9d 100644 --- a/inst/rmarkdown/templates/springer/skeleton/spbasic.bst +++ b/inst/rmarkdown/templates/springer/skeleton/sn-basic.bst @@ -13,8 +13,6 @@ %% computer science publications. %% %% For use with the natbib package (see below). Default is author-year citations. %% %% When citations are numbered, please use \usepackage[numbers]{natbib}. %% -%% A lack of punctuation is the key feature. Springer-Verlag 2004/10/15 %% -%% Report bugs and improvements to: Joylene Vette-Guillaume or Frank Holzwarth %% %% %% %%********************************************************************************%% %% @@ -76,6 +74,7 @@ ENTRY institution journal key + keywords month note number @@ -89,6 +88,11 @@ ENTRY url volume year + archivePrefix + primaryClass + adsurl + adsnote + version } {} { label extra.label sort.label short.list } @@ -246,7 +250,7 @@ FUNCTION {bbl.edby} { "edited by" } FUNCTION {bbl.edition} -{ "edn" } +{ "edn." } FUNCTION {bbl.volume} { "vol" } @@ -266,6 +270,9 @@ FUNCTION {bbl.in} FUNCTION {bbl.pages} { "pp" } +FUNCTION {bbl.incoll.pages} +{ "p" } + FUNCTION {bbl.page} { "p" } @@ -430,6 +437,7 @@ FUNCTION {bibinfo.warn} } if$ } + FUNCTION {format.eprint} { eprint duplicate$ empty$ 'skip$ @@ -442,6 +450,57 @@ FUNCTION {format.eprint} } if$ } + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { "{[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.soft.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + FUNCTION {format.url} { url empty$ { "" } @@ -462,13 +521,18 @@ FUNCTION {format.names} numnames 'namesleft := { namesleft #0 > } { s nameptr - "{vv~}{ll}{ f{}}{ jj}" - format.name$ - remove.dots - bibinfo bibinfo.check - 't := - nameptr #1 > - { + "{vv~}{ll}{ f{}}{jj}" + format.name$ 't := + nameptr #1 > + { + nameptr #3 + #1 + = + numnames #3 + > and + { "others" 't := + #1 'namesleft := } + 'skip$ + if$ namesleft #1 > { ", " * t * } { @@ -494,6 +558,7 @@ FUNCTION {format.names} while$ } if$ } + FUNCTION {format.names.ed} { format.names @@ -706,6 +771,7 @@ FUNCTION {n.separate} } FUNCTION {n.dashify} { +%% n.separate 't := "" { t empty$ not } @@ -924,6 +990,45 @@ FUNCTION {format.journal.eid} } if$ } + +FUNCTION {format.incoll.pages} +{ pages duplicate$ empty$ 'skip$ + { duplicate$ multi.page.check + { + bbl.incoll.pages swap$ + n.dashify + } + { + bbl.page swap$ + } + if$ + tie.or.space.prefix + "pages" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.incoll.chapter.pages} +{ chapter empty$ + 'format.incoll.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + pages empty$ + 'skip$ + { ", " * format.incoll.pages * } + if$ + } + if$ +} + FUNCTION {format.vol.num.pages} { volume field.or.null duplicate$ empty$ 'skip$ @@ -1076,12 +1181,16 @@ FUNCTION {article} format.pages output } if$ + new.sentence format.doi output format.url output format.note output - format.eprint output + format.soft.eprint output + add.blank + format.primaryClass output fin.entry } + FUNCTION {book} { output.bibitem author empty$ @@ -1184,12 +1293,13 @@ FUNCTION {incollection} { format.in.ed.booktitle "booktitle" output.check format.bvolume output format.edition output + new.sentence format.number.series output format.publisher.address output - format.chapter.pages output + format.incoll.chapter.pages output } { format.incoll.inproc.crossref output.nonnull - format.chapter.pages output + format.incoll.chapter.pages output } if$ format.doi output @@ -1211,10 +1321,11 @@ FUNCTION {inproceedings} publisher empty$ { format.organization.address output } { organization "organization" bibinfo.check output - format.publisher.address output + format.bvolume output + new.sentence + format.publisher.address output } if$ - format.bvolume output format.number.series output format.pages output } @@ -1281,6 +1392,32 @@ FUNCTION {misc} format.eprint output fin.entry } + +FUNCTION {insert.comma} +{ duplicate$ empty$ + 'skip$ + { ", " * add.blank } + if$ +} + +FUNCTION {softmisc} +{ output.bibitem + format.authors output + author format.key output + format.date "year" output.check + date.block + format.title output + insert.comma + version output + new.sentence + howpublished "howpublished" bibinfo.check output + format.doi output + format.url output + format.note output + format.softmisc.eprint output + fin.entry +} + FUNCTION {phdthesis} { output.bibitem format.authors "author" output.check @@ -1635,14 +1772,17 @@ FUNCTION {begin.bib} write$ newline$ "\providecommand{\urlprefix}{URL }" write$ newline$ - "\expandafter\ifx\csname urlstyle\endcsname\relax" - write$ newline$ - " \providecommand{\doi}[1]{DOI~\discretionary{}{}{}#1}\else" - write$ newline$ - " \providecommand{\doi}{DOI~\discretionary{}{}{}\begingroup \urlstyle{rm}\Url}\fi" + %%"\expandafter\ifx\csname urlstyle\endcsname\relax" + %%write$ newline$ + %%" \providecommand{\doi}[1]{\discretionary{}{}{}https://doi.org/#1}\else" + %%write$ newline$ + %%" \providecommand{\doi}{\discretionary{}{}{}\begingroup \urlstyle{rm}\Url}\fi" + "\providecommand{\doi}[1]{\url{https://doi.org/#1}}" write$ newline$ "\providecommand{\eprint}[2][]{\url{#2}}" write$ newline$ + " \bibcommenthead " + write$ newline$ } EXECUTE {begin.bib} EXECUTE {init.state.consts} diff --git a/inst/rmarkdown/templates/springer/skeleton/sn-chicago.bst b/inst/rmarkdown/templates/springer/skeleton/sn-chicago.bst new file mode 100644 index 000000000..bb6d2c6fd --- /dev/null +++ b/inst/rmarkdown/templates/springer/skeleton/sn-chicago.bst @@ -0,0 +1,1808 @@ +%%% ==================================================================== +%%% @BibTeX-style-file{ +%%% author = "Glenn Paulley", +%%% version = "4", +%%% date = "28 August 1992", +%%% time = "10:23:39 199", +%%% filename = "chicago.bst", +%%% address = "Data Structuring Group +%%% Department of Computer Science +%%% University of Waterloo +%%% Waterloo, Ontario, Canada +%%% N2L 3G1", +%%% telephone = "(519) 885-1211", +%%% FAX = "(519) 885-1208", +%%% checksum = "26323 1654 5143 37417", +%%% email = "gnpaulle@bluebox.uwaterloo.ca", +%%% codetable = "ISO/ASCII", +%%% keywords = "", +%%% supported = "yes", +%%% abstract = "A BibTeX bibliography style that follows the +%%% `B' reference style of the 13th Edition of +%%% the Chicago Manual of Style. A detailed +%%% feature list is given below.", +%%% docstring = "The checksum field above contains a CRC-16 +%%% checksum as the first value, followed by the +%%% equivalent of the standard UNIX wc (word +%%% count) utility output of lines, words, and +%%% characters. This is produced by Robert +%%% Solovay's checksum utility.", +%%% } +%%% ==================================================================== +% +% "Chicago" BibTeX style, chicago.bst +% =================================== +% +% BibTeX `chicago' style file for BibTeX version 0.99c, LaTeX version 2.09 +% Place it in a file called chicago.bst in the BibTeX search path. +% You need to include chicago.sty as a \documentstyle option. +% (Placing it in the same directory as the LaTeX document should also work.) +% This "chicago" style is based on newapa.bst (American Psych. Assoc.) +% found at ymir.claremont.edu. +% +% Citation format: (author-last-name year) +% (author-last-name and author-last-name year) +% (author-last-name, author-last-name, and author-last-name year) +% (author-last-name et al. year) +% (author-last-name) +% author-last-name (year) +% (author-last-name and author-last-name) +% (author-last-name et al.) +% (year) or (year,year) +% year or year,year +% +% Reference list ordering: alphabetical by author or whatever passes +% for author in the absence of one. +% +% This BibTeX style has support for abbreviated author lists and for +% year-only citations. This is done by having the citations +% actually look like +% +% \citeauthoryear{full-author-info}{abbrev-author-info}{year} +% +% The LaTeX style has to have the following (or similar) +% +% \let\@internalcite\cite +% \def\fullcite{\def\citeauthoryear##1##2##3{##1, ##3}\@internalcite} +% \def\fullciteA{\def\citeauthoryear##1##2##3{##1}\@internalcite} +% \def\shortcite{\def\citeauthoryear##1##2##3{##2, ##3}\@internalcite} +% \def\shortciteA{\def\citeauthoryear##1##2##3{##2}\@internalcite} +% \def\citeyear{\def\citeauthoryear##1##2##3{##3}\@internalcite} +% +% These TeX macro definitions are found in chicago.sty. Additional +% commands to manipulate different components of a citation can be defined +% so that, for example, you can list author's names without parentheses +% if using a citation as a noun or object in a sentence. +% +% This file was originally copied from newapa.bst at ymir.claremont.edu. +% +% Features of chicago.bst: +% ======================= +% +% - full names used in citations, but abbreviated citations are available +% (see above) +% - if an entry has a "month", then the month and year are also printed +% as part of that bibitem. +% - all conjunctions use "and" instead of "\&" +% - major modification from Chicago Manual of Style (13th ed.) is that +% only the first author in a reference appears last name first- +% additional authors appear as J. Q. Public. +% - pages are listed as "pp. xx-xx" in all entry types except +% article entries. +% - book, inbook, and manual use "location: publisher" (or organization) +% for address and publisher. All other types list publishers separately. +% - "pp." are used to identify page numbers for all entry types except +% articles. +% - organization is used as a citation label if neither author nor editor +% is present (for manuals). +% - "et al." is used for long author and editor lists, or when "others" +% is used. +% +% Modifications and bug fixes from newapa.bst: +% =========================================== +% +% - added month, year to bib entries if month is present +% - fixed bug with In proceedings, added necessary comma after title +% - all conjunctions changed to "and" from "\&" +% - fixed bug with author labels in my.full.label: "et al." now is +% generated when "others" is an author name +% - major modification from Chicago Manual of Style (13th ed.) is that +% only the first author in a reference appears last name first- +% additional authors appear as J. Q. Public. +% - pages are listed as "pp. xx-xx" in all entry types except +% article entries. Unnecessary (IMHO) "()" around page numbers +% were removed, and page numbers now don't end with a period. +% - created chicago.sty for use with this bibstyle (required). +% - fixed bugs in FUNCTION {format.vol.num.pages} for missing volume, +% number, and /or pages. Renamed to format.jour.vol. +% - fixed bug in formatting booktitles: additional period an error if +% book has a volume. +% - fixed bug: editors usually given redundant period before next clause +% (format.editors.dot) removed. +% - added label support for organizations, if both author and editor +% are missing (from alpha.bst). If organization is too long, then +% the key field is used for abbreviated citations. +% - In proceedings or books of several volumes, no comma was written +% between the "Volume x" and the page numbers (this was intentional +% in newapa.bst). Fixed. +% - Some journals may not have volumes/numbers, only month/year (eg. +% IEEE Computer). Fixed bug in article style that assumed volume/number +% was always present. +% +% Original documentation for newapa.sty: +% ===================================== +% +% This version was made by modifying the master file made by +% Oren Patashnik (PATASHNIK@SCORE.STANFORD.EDU), and the 'named' BibTeX +% style of Peter F. Patel-Schneider. +% +% Copyright (C) 1985, all rights reserved. +% Copying of this file is authorized only if either +% (1) you make absolutely no changes to your copy, including name, or +% (2) if you do make changes, you name it something other than 'newapa.bst'. +% There are undoubtably bugs in this style. If you make bug fixes, +% improvements, etc. please let me know. My e-mail address is: +% spencer@cgrg.ohio.state.edu or 71160.3141@compuserve.com +% +% This style was made from 'plain.bst', 'named.bst', and 'apalike.bst', +% with lots of tweaking to make it look like APA style, along with tips +% from Young Ryu and Brian Reiser's modifications of 'apalike.bst'. + +ENTRY + { address + author + booktitle + chapter + edition + editor + howpublished + institution + journal + key + keywords + month + note + doi + number + organization + pages + publisher + school + series + title + type + volume + year + eprint + archive + archivePrefix + primaryClass + eid + adsurl + adsnote + version + } + {} + { label.year extra.label sort.year sort.label } + +INTEGERS { output.state before.all mid.sentence after.sentence after.block } + +FUNCTION {init.state.consts} +{ #0 'before.all := + #1 'mid.sentence := + #2 'after.sentence := + #3 'after.block := +} + +STRINGS { s t u } + +FUNCTION {output.nonnull} +{ 's := + output.state mid.sentence = + { ", " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +FUNCTION {add.blank} +{ " " * before.all 'output.state := +} + +% Use a colon to separate output. Used only for address/publisher +% combination in book/inbook types, address/institution for manuals, +% and organization:publisher for proceedings (inproceedings). +% +FUNCTION {output.nonnull.colon} +{ 's := + output.state mid.sentence = + { ": " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +FUNCTION {output} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} + +FUNCTION {output.colon} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull.colon + if$ +} + +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} + +FUNCTION {output.check.colon} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull.colon + if$ +} + +FUNCTION {output.year.check} +{ year empty$ + { "empty year in " cite$ * warning$ } + { write$ + " " year * extra.label * + month empty$ + { "" * } + { ", " * month * "" * } + if$ + mid.sentence 'output.state := + } + if$ +} + + +FUNCTION {fin.entry} +{ add.period$ + write$ + newline$ +} + +FUNCTION {new.block} +{ output.state before.all = + 'skip$ + { after.block 'output.state := } + if$ +} + +FUNCTION {new.sentence} +{ output.state after.block = + 'skip$ + { output.state before.all = + 'skip$ + { after.sentence 'output.state := } + if$ + } + if$ +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + +FUNCTION {new.block.checka} +{ empty$ + 'skip$ + 'new.block + if$ +} + +FUNCTION {new.block.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.block + if$ +} + +FUNCTION {new.sentence.checka} +{ empty$ + 'skip$ + 'new.sentence + if$ +} + +FUNCTION {new.sentence.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.sentence + if$ +} + +FUNCTION {field.or.null} +{ duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ +} + +% +% Emphasize the top string on the stack. +% +FUNCTION {emphasize} +{ duplicate$ empty$ + { pop$ "" } + { "{\em " swap$ * "}" * } + if$ +} + +% +% Emphasize the top string on the stack, but add a trailing space. +% +FUNCTION {emphasize.space} +{ duplicate$ empty$ + { pop$ "" } + { "{\em " swap$ * "\/}" * } + if$ +} + +INTEGERS { nameptr namesleft numnames } +% +% Format bibliographical entries with the first author last name first, +% and subsequent authors with initials followed by last name. +% All names are formatted in this routine. +% +FUNCTION {format.names} +{ 's := + #1 'nameptr := % nameptr = 1; + s num.names$ 'numnames := % numnames = num.name$(s); + numnames 'namesleft := + { namesleft #0 > } + + { nameptr #1 = + {s nameptr "{vv~}{ll}{, jj}{, f{.}.}" format.name$ 't := } + {s nameptr "{f{.}.~}{vv~}{ll}{, jj}" format.name$ 't := } + if$ + nameptr #1 > + { namesleft #1 > + { ", " * t * } + { numnames #2 > + { "," * } + 'skip$ + if$ + t "others" = + { " et~al." * } + { " and " * t * } % from Chicago Manual of Style + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := % nameptr += 1; + namesleft #1 - 'namesleft := % namesleft =- 1; + } + while$ +} + +FUNCTION {my.full.label} +{ 's := + #1 'nameptr := % nameptr = 1; + s num.names$ 'numnames := % numnames = num.name$(s); + numnames 'namesleft := + { namesleft #0 > } + + { s nameptr "{vv~}{ll}" format.name$ 't := % get the next name + nameptr #1 > + { namesleft #1 > + { ", " * t * } + { numnames #2 > + { "," * } + 'skip$ + if$ + t "others" = + { " et~al." * } + { " and " * t * } % from Chicago Manual of Style + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := % nameptr += 1; + namesleft #1 - 'namesleft := % namesleft =- 1; + } + while$ + +} + +FUNCTION {format.names.fml} +% +% Format names in "familiar" format, with first initial followed by +% last name. Like format.names, ALL names are formatted. +% +{ 's := + #1 'nameptr := % nameptr = 1; + s num.names$ 'numnames := % numnames = num.name$(s); + numnames 'namesleft := + { namesleft #0 > } + + { s nameptr "{f.~}{vv~}{ll}{, jj}" format.name$ 't := + + nameptr #1 > + { namesleft #1 > + { ", " * t * } + { numnames #2 > + { "," * } + 'skip$ + if$ + t "others" = + { " et~al." * } + { " and " * t * } +% { " \& " * t * } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := % nameptr += 1; + namesleft #1 - 'namesleft := % namesleft =- 1; + } + while$ +} + +FUNCTION {format.authors} +{ author empty$ + { "" } + { author format.names } + if$ +} + +FUNCTION {format.key} +{ empty$ + { key field.or.null } + { "" } + if$ +} + +% +% Format editor names for use in the "in" types: inbook, incollection, +% inproceedings: first initial, then last names. When editors are the +% LABEL for an entry, then format.editor is used which lists editors +% by last name first. +% +FUNCTION {format.editors.fml} +{ editor empty$ + { "" } + { editor format.names.fml + editor num.names$ #1 > + { " (Eds.)" * } + { " (Ed.)" * } + if$ + } + if$ +} + +% +% Format editor names for use in labels, last names first. +% +FUNCTION {format.editors} +{ editor empty$ + { "" } + { editor format.names + editor num.names$ #1 > + { " eds." * } + { " ed." * } + if$ + } + if$ +} + +FUNCTION {in.format.editors} +{ editor empty$ + { "" } + { editor format.names + editor num.names$ #1 > + { " eds. " swap$ * } + { " ed. " swap$ * } + if$ + } + if$ +} + +FUNCTION {format.title} +{ title empty$ + { "" } + { title "t" change.case$ } + if$ +} + +% Note that the APA style requres case changes +% in article titles. The following does not +% change cases. If you perfer it, uncomment the +% following and comment out the above. + +%FUNCTION {format.title} +%{ title empty$ +% { "" } +% { title } +% if$ +%} + +FUNCTION {n.dashify} +{ 't := + "" + { t empty$ not } + { t #1 #1 substring$ "-" = + { t #1 #2 substring$ "--" = not + { "--" * + t #2 global.max$ substring$ 't := + } + { { t #1 #1 substring$ "-" = } + { "-" * + t #2 global.max$ substring$ 't := + } + while$ + } + if$ + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + +FUNCTION {format.btitle} +{ edition empty$ + { title emphasize } + { title empty$ + { title emphasize } + { volume empty$ % gnp - check for volume, then don't need period + { "{\em " title * "\/} (" * edition * " ed.)" * "." * } + { "{\em " title * "\/} (" * edition * " ed.)" * } + if$ + } + if$ + } + if$ +} + +FUNCTION {format.emphasize.booktitle} +{ edition empty$ + { booktitle emphasize } + { booktitle empty$ + { booktitle emphasize } + { volume empty$ % gnp - extra period an error if book has a volume + { "{\em " booktitle * "\/} (" * edition * " ed.)" * "." *} + { "{\em " booktitle * "\/} (" * edition * " ed.)" * } + if$ + } + if$ + } + if$ + } + + +FUNCTION {tie.or.space.connect} +{ duplicate$ text.length$ #3 < + { "~" } + { " " } + if$ + swap$ * * +} + +FUNCTION {either.or.check} +{ empty$ + 'pop$ + { "can't use both " swap$ * " fields in " * cite$ * warning$ } + if$ +} + +FUNCTION {format.bvolume} +{ volume empty$ + { "" } + { "Volume" volume tie.or.space.connect % gnp - changed to mixed case + series empty$ + 'skip$ + { " of " * series emphasize * } + if$ + "volume and number" number either.or.check + } + if$ +} + +FUNCTION {format.number.series} +{ volume empty$ + { number empty$ + { series field.or.null } + { output.state mid.sentence = + { "Number" } % gnp - changed to mixed case always + { "Number" } + if$ + number tie.or.space.connect + series empty$ + { "there's a number but no series in " cite$ * warning$ } + { " in " * series * } + if$ + } + if$ + } + { "" } + if$ +} + +INTEGERS { multiresult } + +FUNCTION {multi.page.check} +{ 't := + #0 'multiresult := + { multiresult not + t empty$ not + and + } + { t #1 #1 substring$ + duplicate$ "-" = + swap$ duplicate$ "," = + swap$ "+" = + or or + { #1 'multiresult := } + { t #2 global.max$ substring$ 't := } + if$ + } + while$ + multiresult +} + +FUNCTION {format.pages} +{ pages empty$ + { "" } + { pages multi.page.check + { "pp.\ " pages n.dashify tie.or.space.connect } % gnp - removed () + { "pp.\ " pages tie.or.space.connect } + if$ + } + if$ +} + + +FUNCTION {format.in.pages} +{ pages empty$ + { "" } + { pages multi.page.check + { "" pages n.dashify tie.or.space.connect } % gnp - removed () + { "" pages tie.or.space.connect } + if$ + } + if$ +} + +% By Young (and Spencer) +% GNP - fixed bugs with missing volume, number, and/or pages +% +% Format journal, volume, number, pages for article types. +% +FUNCTION {format.jour.vol} +{ journal empty$ + { "no journal in " cite$ * warning$ + "" } + { journal emphasize.space } + if$ + number empty$ + { volume empty$ + { "no number and no volume in " cite$ * warning$ + "" * } + { "~" * Volume * "" * } + if$ + } + { volume empty$ + {"no volume for " cite$ * warning$ + "~(" * number * ")" * } + { "~" * + volume emphasize.space + "(" * number * ")" * * } + if$ + } + if$ + pages empty$ + {"page numbers missing in " cite$ * warning$ + "" * } % gnp - place a null string on the stack for output + { duplicate$ empty$ + { pop$ format.pages } + { ": " * pages n.dashify * } % gnp - removed pp. for articles + if$ + } + if$ +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + 'format.pages + { type empty$ + { "Chapter" } % gnp - changed to mixed case + { type "t" change.case$ } + if$ + chapter tie.or.space.connect + pages empty$ + {"page numbers missing in " cite$ * warning$} % gnp - added check + { ", " * format.pages * } + if$ + } + if$ +} + + +FUNCTION {format.in.chapter.pages} +{ chapter empty$ + 'format.in.pages + { type empty$ + { "Chapter" } % gnp - changed to mixed case + { type "t" change.case$ } + if$ + chapter tie.or.space.connect + pages empty$ + {"page numbers missing in " cite$ * warning$} % gnp - added check + { ", " * format.in.pages * } + if$ + } + if$ +} + +FUNCTION {format.in.ed.booktitle} +{ booktitle empty$ + { "" } + { editor empty$ + { "In " format.emphasize.booktitle * } + { "In " format.editors.fml * ", " * format.emphasize.booktitle * } + if$ + } + if$ +} + +FUNCTION {format.in.coll.ed.booktitle} +{ booktitle empty$ + { "" } + { editor empty$ + { "" format.emphasize.booktitle * } + { "In " format.emphasize.booktitle * ", " * in.format.editors * } + if$ + } + if$ +} + +FUNCTION {format.thesis.type} +{ type empty$ + 'skip$ + { pop$ + type "t" change.case$ + } + if$ +} + +FUNCTION {format.tr.number} +{ type empty$ + { "Technical Report" } + 'type + if$ + number empty$ + { "t" change.case$ } + { number tie.or.space.connect } + if$ +} + +FUNCTION {format.article.crossref} +{ "See" + "\citeN{" * crossref * "}" * +} + +FUNCTION {format.crossref.editor} +{ editor #1 "{vv~}{ll}" format.name$ + editor num.names$ duplicate$ + #2 > + { pop$ " et~al." * } + { #2 < + 'skip$ + { editor #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { " et~al." * } + { " and " * editor #2 "{vv~}{ll}" format.name$ * } + if$ + } + if$ + } + if$ +} + +FUNCTION {format.book.crossref} +{ volume empty$ + { "empty volume in " cite$ * "'s crossref of " * crossref * warning$ + "In " + } + { "Volume" volume tie.or.space.connect % gnp - changed to mixed case + " of " * + } + if$ + editor empty$ + editor field.or.null author field.or.null = + or + { key empty$ + { series empty$ + { "need editor, key, or series for " cite$ * " to crossref " * + crossref * warning$ + "" * + } + { "{\em " * series * "\/}" * } + if$ + } + { key * } + if$ + } + { format.crossref.editor * } + if$ + " \citeN{" * crossref * "}" * +} + +FUNCTION {format.incoll.inproc.crossref} +{ "See" + " \citeN{" * crossref * "}" * +} + +% format.lab.names: +% +% determines "short" names for the abbreviated author information. +% "Long" labels are created in calc.label, using the routine my.full.label +% to format author and editor fields. +% +% There are 4 cases for labels. (n=3 in the example) +% a) one author Foo +% b) one to n Foo, Bar and Baz +% c) use of "and others" Foo, Bar et al. +% d) more than n Foo et al. +% +FUNCTION {format.lab.names} +{ 's := + s num.names$ 'numnames := + numnames #2 > % change number to number of others allowed before + % forcing "et al". + { s #1 "{vv~}{ll}" format.name$ " et~al." * } + { + numnames #1 - 'namesleft := + #2 'nameptr := + s #1 "{vv~}{ll}" format.name$ + { namesleft #0 > } + { nameptr numnames = + { s nameptr "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { " et~al." * } + { " and " * s nameptr "{vv~}{ll}" format.name$ * } + if$ + } + { ", " * s nameptr "{vv~}{ll}" format.name$ * } + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } + if$ +} + +FUNCTION {author.key.label} +{ author empty$ + { key empty$ + { "no key, author in " cite$ * warning$ + cite$ #1 #3 substring$ } + 'key + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {editor.key.label} +{ editor empty$ + { key empty$ + { "no key, editor in " cite$ * warning$ + cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.lab.names } + if$ +} + +FUNCTION {author.key.organization.label} +% +% added - gnp. Provide label formatting by organization if author is null. +% +{ author empty$ + { organization empty$ + { key empty$ + { "no key, author or organization in " cite$ * warning$ + cite$ #1 #3 substring$ } + 'key + if$ + } + { organization } + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {editor.key.organization.label} +% +% added - gnp. Provide label formatting by organization if editor is null. +% +{ editor empty$ + { organization empty$ + { key empty$ + { "no key, editor or organization in " cite$ * warning$ + cite$ #1 #3 substring$ } + 'key + if$ + } + { organization } + if$ + } + { editor format.lab.names } + if$ +} + +FUNCTION {author.editor.key.label} +{ author empty$ + { editor empty$ + { key empty$ + { "no key, author, or editor in " cite$ * warning$ + cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.lab.names } + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {calc.label} +% +% Changed - GNP. See also author.organization.sort, editor.organization.sort +% Form label for BibTeX entry. The classification of which fields are used +% for which type of entry (book, inbook, etc.) are taken from alpha.bst. +% The change here from newapa is to also include organization as a +% citation label if author or editor is missing. +% +{ type$ "book" = + type$ "inbook" = + or + 'author.editor.key.label + { type$ "proceedings" = + 'editor.key.organization.label + { type$ "manual" = + 'author.key.organization.label + 'author.key.label + if$ + } + if$ + } + if$ + + author empty$ % generate the full label citation information. + { editor empty$ + { organization empty$ + { "no author, editor, or organization in " cite$ * warning$ + "??" } + { organization } + if$ + } + { editor my.full.label } + if$ + } + { author my.full.label } + if$ + +% leave label on the stack, to be popped when required. + + "}{" * swap$ * "}{" * +% year field.or.null purify$ #-1 #4 substring$ * +% +% save the year for sort processing afterwards (adding a, b, c, etc.) +% + year field.or.null purify$ #-1 #4 substring$ + 'label.year := +} + +FUNCTION {output.bibitem} +{ newline$ + + "\bibitem[\protect\citeauthoryear{" write$ + calc.label write$ + sort.year write$ + "}]{" write$ + + cite$ write$ + "}" write$ + newline$ + "" + before.all 'output.state := +} + +FUNCTION {output.doi} +{ + doi empty$ + { skip$ } + { "\doi{" doi * "}" * output } + if$ +} + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { "{[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors + "author" output.check +add.period$ "" * + author format.key output % added + output.year.check % added + new.block + format.title + "title" output.check + new.block + crossref missing$ + { format.jour.vol output + } + { format.article.crossref output.nonnull + format.pages output + } + if$ + new.block + output.doi + new.block + format.eprint output + add.blank + format.primaryClass output + fin.entry +} + +FUNCTION {book} +{ output.bibitem + author empty$ + { format.editors + "author and editor" output.check } + { format.authors + output.nonnull +add.period$ "" * + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + output.year.check % added + new.block + format.btitle + "title" output.check + crossref missing$ + { format.bvolume output + new.block + format.number.series output + new.sentence + address output + publisher "publisher" output.check.colon + } + { new.block + format.book.crossref output.nonnull + } + if$ + new.block + note output + fin.entry +} + +FUNCTION {booklet} +{ output.bibitem + format.authors output + author format.key output % added + output.year.check % added + new.block + format.title + "title" output.check + new.block + howpublished output + address output + new.block + note output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors + "author and editor" output.check + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + output.year.check % added + new.block + format.btitle + "title" output.check + crossref missing$ + { format.bvolume output + format.chapter.pages + "chapter and pages" output.check + new.block + format.number.series output + new.sentence + address output + publisher + "publisher" output.check.colon + } + { format.chapter.pages "chapter and pages" output.check + new.block + format.book.crossref output.nonnull + } + if$ + new.block + note output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors + "author" output.check +add.period$ "" * + author format.key output % added + output.year.check % added + new.block + format.title + "title" output.check + crossref missing$ + { format.in.coll.ed.booktitle +"booktitle" output.check + format.bvolume output + format.number.series output + format.in.chapter.pages output % gnp - was special.output.nonnull +% left out comma before page numbers + new.sentence + address output + publisher "publisher" output.check.colon + } + { format.incoll.inproc.crossref + output.nonnull + format.in.chapter.pages output + } + if$ + new.block + note output + new.block + output.doi + fin.entry +} + +FUNCTION {inproceedings} +{ output.bibitem + format.authors + "author" output.check + author format.key output % added + output.year.check % added + new.block + format.title + "title" output.check + new.block + crossref missing$ + { format.in.ed.booktitle + "booktitle" output.check + format.bvolume output + format.number.series output + address output + format.pages output + new.sentence + organization output + publisher output.colon + } + { format.incoll.inproc.crossref output.nonnull + format.pages output + } + if$ + new.block + note output + fin.entry +} + +FUNCTION {conference} { inproceedings } + +FUNCTION {manual} +{ output.bibitem + author empty$ + { editor empty$ + { organization "organization" output.check + organization format.key output } % if all else fails, use key + { format.editors "author and editor" output.check } + if$ + } + { format.authors output.nonnull } + if$ + output.year.check % added + new.block + format.btitle + "title" output.check + organization address new.block.checkb +% Reversed the order of "address" and "organization", added the ":". + address output + organization "organization" output.check.colon +% address output +% ":" output +% organization output + new.block + note output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors + "author" output.check + author format.key output % added + output.year.check % added + new.block + format.title + "title" output.check + new.block + "Master's thesis" format.thesis.type output.nonnull + school "school" output.check + address output + new.block + note output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output +add.period$ "" * + author format.key output % added + output.year.check % added + title howpublished new.block.checkb + format.title output + new.block + howpublished output + new.block + note output + fin.entry +} + +FUNCTION {softmisc} +{ output.bibitem + format.authors output +add.period$ "" * + author format.key output % added + %%output.year.check % added + year output + title howpublished new.block.checkb + format.title output + version output + new.block + howpublished output + new.block + note output + new.block + format.softmisc.eprint output + fin.entry +} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors + "author" output.check + author format.key output % added + output.year.check % added + new.block + format.btitle + "title" output.check + new.block + "Ph.\ D. thesis" format.thesis.type output.nonnull + school "school" output.check + address output + new.block + note output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization output + organization format.key output } % gnp - changed from author format.key + { format.editors output.nonnull } + if$ +% author format.key output % gnp - removed (should be either +% editor or organization + output.year.check % added (newapa) + new.block + format.btitle + "title" output.check + format.bvolume output + format.number.series output + address output + new.sentence + organization output + publisher output.colon + new.block + note output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors + "author" output.check + author format.key output % added + output.year.check % added + new.block + format.title + "title" output.check + new.block + format.tr.number output.nonnull + institution + "institution" output.check + address output + new.block + note output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors + "author" output.check + author format.key output % added + output.year.check % added + new.block + format.title + "title" output.check + new.block + note "note" output.check + fin.entry +} + +FUNCTION {default.type} { misc } + +MACRO {jan} {"January"} + +MACRO {feb} {"February"} + +MACRO {mar} {"March"} + +MACRO {apr} {"April"} + +MACRO {may} {"May"} + +MACRO {jun} {"June"} + +MACRO {jul} {"July"} + +MACRO {aug} {"August"} + +MACRO {sep} {"September"} + +MACRO {oct} {"October"} + +MACRO {nov} {"November"} + +MACRO {dec} {"December"} + +MACRO {acmcs} {"ACM Computing Surveys"} + +MACRO {acta} {"Acta Informatica"} + +MACRO {ai} {"Artificial Intelligence"} + +MACRO {cacm} {"Communications of the ACM"} + +MACRO {ibmjrd} {"IBM Journal of Research and Development"} + +MACRO {ibmsj} {"IBM Systems Journal"} + +MACRO {ieeese} {"IEEE Transactions on Software Engineering"} + +MACRO {ieeetc} {"IEEE Transactions on Computers"} + +MACRO {ieeetcad} + {"IEEE Transactions on Computer-Aided Design of Integrated Circuits"} + +MACRO {ipl} {"Information Processing Letters"} + +MACRO {jacm} {"Journal of the ACM"} + +MACRO {jcss} {"Journal of Computer and System Sciences"} + +MACRO {scp} {"Science of Computer Programming"} + +MACRO {sicomp} {"SIAM Journal on Computing"} + +MACRO {tocs} {"ACM Transactions on Computer Systems"} + +MACRO {tods} {"ACM Transactions on Database Systems"} + +MACRO {tog} {"ACM Transactions on Graphics"} + +MACRO {toms} {"ACM Transactions on Mathematical Software"} + +MACRO {toois} {"ACM Transactions on Office Information Systems"} + +MACRO {toplas} {"ACM Transactions on Programming Languages and Systems"} + +MACRO {tcs} {"Theoretical Computer Science"} + +READ + +FUNCTION {sortify} +{ purify$ + "l" change.case$ +} + +INTEGERS { len } + +FUNCTION {chop.word} +{ 's := + 'len := + s #1 len substring$ = + { s len #1 + global.max$ substring$ } + 's + if$ +} + + + +FUNCTION {sort.format.names} +{ 's := + #1 'nameptr := + "" + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { nameptr #1 > + { " " * } + 'skip$ + if$ + s nameptr "{vv{ } }{ll{ }}{ f{ }}{ jj{ }}" format.name$ 't := + nameptr numnames = t "others" = and + { " et~al" * } + { t sortify * } + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ +} + +FUNCTION {sort.format.title} +{ 't := + "A " #2 + "An " #3 + "The " #4 t chop.word + chop.word + chop.word + sortify + #1 global.max$ substring$ +} + +FUNCTION {author.sort} +{ author empty$ + { key empty$ + { "to sort, need author or key in " cite$ * warning$ + "" } + { key sortify } + if$ + } + { author sort.format.names } + if$ +} + +FUNCTION {editor.sort} +{ editor empty$ + { key empty$ + { "to sort, need editor or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { editor sort.format.names } + if$ +} + +FUNCTION {author.editor.sort} +{ author empty$ + { "missing author in " cite$ * warning$ + editor empty$ + { key empty$ + { "to sort, need author, editor, or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { editor sort.format.names } + if$ + } + { author sort.format.names } + if$ +} + +FUNCTION {author.organization.sort} +% +% added - GNP. Stack author or organization for sorting (from alpha.bst). +% Unlike alpha.bst, we need entire names, not abbreviations +% +{ author empty$ + { organization empty$ + { key empty$ + { "to sort, need author, organization, or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { organization sortify } + if$ + } + { author sort.format.names } + if$ +} + +FUNCTION {editor.organization.sort} +% +% added - GNP. Stack editor or organization for sorting (from alpha.bst). +% Unlike alpha.bst, we need entire names, not abbreviations +% +{ editor empty$ + { organization empty$ + { key empty$ + { "to sort, need editor, organization, or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { organization sortify } + if$ + } + { editor sort.format.names } + if$ +} + +FUNCTION {presort} +% +% Presort creates the bibentry's label via a call to calc.label, and then +% sorts the entries based on entry type. Chicago.bst adds support for +% including organizations as the sort key; the following is stolen from +% alpha.bst. +% +{ calc.label sortify % recalculate bibitem label + year field.or.null purify$ #-1 #4 substring$ * % add year + " " + * + type$ "book" = + type$ "inbook" = + or + 'author.editor.sort + { type$ "proceedings" = + 'editor.organization.sort + { type$ "manual" = + 'author.organization.sort + 'author.sort + if$ + } + if$ + } + if$ + #1 entry.max$ substring$ % added for newapa + 'sort.label := % added for newapa + sort.label % added for newapa + * + " " + * + title field.or.null + sort.format.title + * + #1 entry.max$ substring$ + 'sort.key$ := +} + +ITERATE {presort} + +SORT % by label, year, author/editor, title + +STRINGS { last.label next.extra } + +INTEGERS { last.extra.num } + +FUNCTION {initialize.extra.label.stuff} +{ #0 int.to.chr$ 'last.label := + "" 'next.extra := + #0 'last.extra.num := +} + +FUNCTION {forward.pass} +% +% Pass through all entries, comparing current entry to last one. +% Need to concatenate year to the stack (done by calc.label) to determine +% if two entries are the same (see presort) +% +{ last.label + calc.label year field.or.null purify$ #-1 #4 substring$ * % add year + #1 entry.max$ substring$ = % are they equal? + { last.extra.num #1 + 'last.extra.num := + last.extra.num int.to.chr$ 'extra.label := + } + { "a" chr.to.int$ 'last.extra.num := + "" 'extra.label := + calc.label year field.or.null purify$ #-1 #4 substring$ * % add year + #1 entry.max$ substring$ 'last.label := % assign to last.label + } + if$ +} + +FUNCTION {reverse.pass} +{ next.extra "b" = + { "a" 'extra.label := } + 'skip$ + if$ + label.year extra.label * 'sort.year := + extra.label 'next.extra := +} + +EXECUTE {initialize.extra.label.stuff} + +ITERATE {forward.pass} + +REVERSE {reverse.pass} + +FUNCTION {bib.sort.order} +{ sort.label + " " + * + year field.or.null sortify + * + " " + * + title field.or.null + sort.format.title + * + #1 entry.max$ substring$ + 'sort.key$ := +} + +ITERATE {bib.sort.order} + +SORT % by sort.label, year, title --- giving final bib. order. + +FUNCTION {begin.bib} + +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + "\begin{thebibliography}{}" write$ newline$ + "\providecommand{\doi}[1]{\url{https://doi.org/#1}}" + write$ newline$ + "\bibcommenthead" write$ newline$ +} + + +EXECUTE {begin.bib} + +EXECUTE {init.state.consts} + +ITERATE {call.type$} + +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} + +EXECUTE {end.bib} + diff --git a/inst/rmarkdown/templates/springer/skeleton/sn-jnl.cls b/inst/rmarkdown/templates/springer/skeleton/sn-jnl.cls new file mode 100644 index 000000000..1295f56a7 --- /dev/null +++ b/inst/rmarkdown/templates/springer/skeleton/sn-jnl.cls @@ -0,0 +1 @@ +%% %% This is file `sn-jnl.cls', %% generated with the docstrip utility. %% %% The original source files were: %% %% classes.dtx (with options: `sn-jnl') %% %% This is a generated file. %% %% Copyright 1993 1994 1995 1996 1997 1998 1999 2000 2001 2002 2003 2004 2005 2006 2007 2008 2009 %% The LaTeX3 Project and any individual authors listed elsewhere %% in this file. %% %% This file was generated from file(s) of the LaTeX base system. %% -------------------------------------------------------------- %% %% It may be distributed and/or modified under the %% conditions of the LaTeX Project Public License, either version 1.3c %% of this license or (at your option) any later version. %% The latest version of this license is in %% http://www.latex-project.org/lppl.txt %% and version 1.3c or later is part of all distributions of LaTeX %% version 2005/12/01 or later. %% %% This file has the LPPL maintenance status "maintained". %% %% This file may only be distributed together with a copy of the LaTeX %% base system. You may however distribute the LaTeX base system without %% such generated files. %% %% The list of all files belonging to the LaTeX base distribution is %% given in the file `manifest.txt'. See also `legal.txt' for additional %% information. %% %% The list of derived (unpacked) files belonging to the distribution %% and covered by LPPL is defined by the unpacking scripts (with %% extension .ins) which are part of the distribution. %% \CharacterTable %% {Upper-case \A\B\C\D\E\F\G\H\I\J\K\L\M\N\O\P\Q\R\S\T\U\V\W\X\Y\Z %% Lower-case \a\b\c\d\e\f\g\h\i\j\k\l\m\n\o\p\q\r\s\t\u\v\w\x\y\z %% Digits \0\1\2\3\4\5\6\7\8\9 %% Exclamation \! Double quote \" Hash (number) \# %% Dollar \$ Percent \% Ampersand \& %% Acute accent \' Left paren \( Right paren \) %% Asterisk \* Plus \+ Comma \, %% Minus \- Point \. Solidus \/ %% Colon \: Semicolon \; Less than \< %% Equals \= Greater than \> Question mark \? %% Commercial at \@ Left bracket \[ Backslash \\ %% Right bracket \] Circumflex \^ Underscore \_ %% Grave accent \` Left brace \{ Vertical bar \| %% Right brace \} Tilde \~} \NeedsTeXFormat{LaTeX2e}[1995/12/01] \ProvidesClass{sn-jnl} [2019/11/18 v0.1: An authoring template for Springer Journal articles] \newif\if@restonecol \newif\if@titlepage \@titlepagefalse \newif\if@cropmarkson \@cropmarksonfalse \newif\ifDoublecol \Doublecolfalse% \newif\ifpagebody\global\pagebodyfalse% \newif\if@iicol\global\@iicolfalse% \newif\if@bibcomment\global\@bibcommentfalse% \newif\if@referee\global\@refereefalse% \newif\if@vrulerlinenumberon\global\@vrulerlinenumberonfalse% \newif\if@pdflatex\global\@pdflatexfalse% \newif\if@remarkboxon\global\@remarkboxonfalse% \newif\if@Numbered@refstyle\global\@Numbered@refstylefalse% Namedate \newif\if@Spr@basic@refstyle\global\@Spr@basic@refstylefalse% 1.Basic Springer Nature Reference Style/Chemistry Reference Style -> sn-basic.bst \newif\if@Mathphys@refstyle\global\@Mathphys@refstylefalse% 2.Math and Physical Sciences Reference Style -> sn-mathphys.bst \newif\if@APS@refstyle\global\@APS@refstylefalse% 3.American Physical Society (APS) Reference Style -> sn-APS.bst \newif\if@Vancouver@refstyle\global\@Vancouver@refstylefalse% 4.Vancouver Reference Style -> sn-vancouver.bst \newif\if@APA@refstyle\global\@APA@refstylefalse% 5.APA-based Social Sciences/Psychology Reference Style -> sn-apacite.bst \newif\if@Chicago@refstyle\global\@Chicago@refstylefalse% 6.Chicago-based Humanities Reference Style -> sn-chicago.bst \newif\if@Standard@Nature@refstyle\global\@Standard@Nature@refstylefalse% 7.Standard Nature Research Style -> sn-nature.bst \newif\if@Default@refstyle\global\@Default@refstylefalse% 8. default reference style - no bib/bst required %% Template Options \DeclareOption{a4paper}{\PassOptionsToPackage{a4}{crop}} \DeclareOption{a3paper}{\PassOptionsToClass{a3paper}{article}\PassOptionsToPackage{a3}{crop}} \DeclareOption{centre}{\PassOptionsToPackage{center}{crop}} \DeclareOption{crop}{\PassOptionsToPackage{frame}{crop}\global\@cropmarksontrue} \DeclareOption{nocrop}{\PassOptionsToPackage{off}{crop}\global\@cropmarksontrue} \DeclareOption{info}{\PassOptionsToPackage{info}{crop}} \DeclareOption{noinfo}{\PassOptionsToPackage{noinfo}{crop}} %% Classfile Options \DeclareOption{oneside}{\@twosidefalse \@mparswitchfalse} \DeclareOption{twoside}{\@twosidetrue \@mparswitchtrue} \DeclareOption{draft}{\setlength\overfullrule{5pt}} \DeclareOption{titlepage}{\@titlepagetrue} \DeclareOption{notitlepage}{\@titlepagefalse} \DeclareOption{onecolumn}{\@twocolumnfalse} \DeclareOption{twocolumn}{\@twocolumntrue} \DeclareOption{openbib}{\let\if@openbib\iftrue} \DeclareOption{pagegrid}{\global\pagebodytrue}% \DeclareOption{iicol}{\global\@iicoltrue}% \DeclareOption{bibcomment}{\global\@bibcommenttrue}% \DeclareOption{referee}{\global\@refereetrue}% \DeclareOption{lineno}{\global\@vrulerlinenumberontrue}% \DeclareOption{pdflatex}{\global\@pdflatextrue}% \DeclareOption{remarkboxoff}{\global\@remarkboxonfalse}% \DeclareOption{sn-basic}{\global\@Spr@basic@refstyletrue}% \DeclareOption{sn-mathphys}{\global\@Mathphys@refstyletrue}% \DeclareOption{sn-aps}{\global\@APS@refstyletrue}% \DeclareOption{sn-vancouver}{\global\@Vancouver@refstyletrue}% \DeclareOption{sn-apa}{\global\@APA@refstyletrue}% \DeclareOption{sn-chicago}{\global\@Chicago@refstyletrue}% \DeclareOption{sn-nature}{\global\@Standard@Nature@refstyletrue}% \DeclareOption{default}{\global\@Default@refstyletrue}% \DeclareOption{Numbered}{\global\@Numbered@refstyletrue}% \DeclareOption{NameDate}{\global\@Numbered@refstylefalse}% %%\ExecuteOptions{twosidecrop,crop,centre,info,croppage} \ProcessOptions \LoadClass[twoside,fleqn]{article} \gdef\refereedefns{% \if@referee% \usepackage{setspace}% \doublespacing% \fi}% \refereedefns% %% General Packages Used % \AtBeginDocument{% %%\newcommand*\ExtraParaSkip{12pt}% \SetFootnoteHook{\hspace*{-8pt}}% \DeclareNewFootnote{A}[gobble]% \setlength{\skip\footinsA}{0pt}}% % %%%%%%%%%%%%%%%%%%%%%%%%%%%% Fonts & Sizes %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % %% Fonts Used %%\RequirePackage[T1]{fontenc}% % \DeclareOldFontCommand{\rm}{\normalfont\rmfamily}{\mathrm}% \DeclareOldFontCommand{\sf}{\normalfont\sffamily}{\mathsf}% \DeclareOldFontCommand{\tt}{\normalfont\ttfamily}{\mathtt}% \DeclareOldFontCommand{\bf}{\normalfont\bfseries}{\mathbf}% \DeclareOldFontCommand{\it}{\normalfont\itshape}{\mathit}% \DeclareOldFontCommand{\sl}{\normalfont\slshape}{\@nomath\sl}% \DeclareOldFontCommand{\sc}{\normalfont\scshape}{\@nomath\sc}% \DeclareRobustCommand*\cal{\@fontswitch\relax\mathcal}% \DeclareRobustCommand*\mit{\@fontswitch\relax\mathnormal}% % \renewcommand\normalsize{% \@setfontsize\normalsize{10bp}{12bp}% \abovedisplayskip 12\p@ \@plus2\p@ \@minus1\p@ \abovedisplayshortskip \z@ \@plus3\p@% \belowdisplayshortskip 3\p@ \@plus3\p@ \@minus3\p@% \belowdisplayskip \abovedisplayskip% \let\@listi\@listI}% \normalsize% % \newcommand\medsize{% \@setfontsize\small\@xipt{13}% \abovedisplayskip 5\p@ \@plus3\p@ \@minus4\p@ \abovedisplayshortskip \z@ \@plus2\p@ \belowdisplayshortskip 3\p@ \@plus2\p@ \@minus2\p@ \def\@listi{\leftmargin\leftmargini \topsep 4\p@ \@plus2\p@ \@minus2\p@ \parsep 2\p@ \@plus\p@ \@minus\p@ \itemsep \parsep}% \belowdisplayskip \abovedisplayskip}% % \renewcommand\small{% \@setfontsize\small\@ixpt{11}% \abovedisplayskip 5\p@ \@plus3\p@ \@minus4\p@ \abovedisplayshortskip \z@ \@plus2\p@ \belowdisplayshortskip 3\p@ \@plus2\p@ \@minus2\p@ \def\@listi{\leftmargin\leftmargini \topsep 4\p@ \@plus2\p@ \@minus2\p@ \parsep 2\p@ \@plus\p@ \@minus\p@ \itemsep \parsep}% \belowdisplayskip \abovedisplayskip}% % \renewcommand\footnotesize{% \@setfontsize\footnotesize{7}{8}% \abovedisplayskip 5\p@ \@plus2\p@ \@minus4\p@ \abovedisplayshortskip \z@ \@plus\p@ \belowdisplayshortskip 3\p@ \@plus\p@ \@minus2\p@ \def\@listi{\leftmargin\leftmargini \topsep 3\p@ \@plus\p@ \@minus\p@ \parsep 2\p@ \@plus\p@ \@minus\p@ \itemsep \parsep}% \belowdisplayskip \abovedisplayskip} % \renewcommand\scriptsize{\@setfontsize\scriptsize\@ixpt\@ixpt}% \newcommand\scrisize{\@setfontsize\scrisize{9.3}{9}}% \renewcommand\tiny{\@setfontsize\tiny\@vpt\@vipt}% \renewcommand\large{\@setfontsize\large{12}{14}}% \newcommand\larg{\@setfontsize\larg{11}{13}}% \renewcommand\Large{\@setfontsize\Large{16}{18}}% \renewcommand\LARGE{\@setfontsize\LARGE\@xviipt{22}}% \renewcommand\huge{\@setfontsize\huge\@xxpt{25}}% \renewcommand\Huge{\@setfontsize\Huge\@xxvpt{30}}% % \DeclareMathSizes{\@ixpt}{\@ixpt}{7}{5}% \DeclareMathSizes{\@xpt}{\@xpt}{7}{5}% \DeclareMathSizes{\@xipt}{\@xipt}{7}{5}% % \DeclareRobustCommand*\textsubscript[1]{% \@textsubscript{\selectfont#1}}% % \def\@textsubscript#1{% {\m@th\ensuremath{_{\mbox{\fontsize\sf@size\z@#1}}}}}% % %%%%%%%%%%%%%%%%%%%%%%%%%%%% Layout Settings %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % %%\RequirePackage{geometry}% % \newlength\columnhsize% % %% Regular Pages (for Opening page - redefined) % \if@iicol% % %% for double column used sn-medium design trim and page size %% % \setlength\headheight{12pt}% \setlength\headsep{5.15mm}% % \setlength\columnsep{8mm}% \setlength\columnhsize{76mm}% % \setlength\maxdepth{0pt}% \setlength\footnotesep{7\p@}% \setlength{\skip\footins}{18\p@ \@plus 6\p@ \@minus 3\p@}% % \RequirePackage[% reversemp, paperwidth=210mm, paperheight=297mm, top={26mm}, headheight={12pt}, headsep={5.15mm}, text={160mm,216mm}, marginparsep=5mm, marginparwidth=12mm, bindingoffset=6mm, footskip=10.13mm,twocolumn]{geometry}% % \renewcommand\footnoterule{% \kern3\p@% \hrule \@height.2mm \@width\columnwidth% \kern5.5\p@}% % \else% %% For single column used smallcond design trim and page size %% \RequirePackage[% reversemp, paperwidth=210mm, paperheight=297mm, top={26mm}, headheight={5.5pt}, headsep={5.6mm}, text={31pc,194.25mm}, marginparsep=5mm, marginparwidth=12mm, bindingoffset=6mm, footskip=10mm]{geometry} % \setlength\maxdepth{0pt}% \setlength\columnsep{5mm}% \setlength{\marginparsep}{5mm}% \setlength{\marginparwidth}{12mm}% \setlength\footnotesep{5.75\p@}% \setlength{\skip\footins}{8\p@ \@plus 4\p@ \@minus 0\p@}% % \renewcommand\footnoterule{% \kern3\p@% \ifodd\c@page% \hrule \@height.2mm \@width\textwidth% \else% \hrule \@height.2mm \@width37mm \fi% \kern5.5\p@}% % \fi% % % \setlength\parindent{1.5em}% % \def\StepUpCounter#1{\global\advance#1by 1\relax}% \def\StepDownCounter#1{\global\advance#1by -1\relax}% % %%%%%%%%%%%%%%%%%%%%%%%%%%%% Pagination Settings %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % % Line spacing \setlength\lineskip{1\p@}% \setlength\normallineskip{1\p@}% %%\renewcommand\baselinestretch{1.5}% \parskip=0pt% % % Page break penalties % \@lowpenalty 51 \@medpenalty 151 \@highpenalty 301 % % Disallow widows and orphans % \clubpenalty 10000 \widowpenalty 10000 % % Disable page breaks before equations, allow pagebreaks after % equations and discourage widow lines before equations. % \displaywidowpenalty 100 \predisplaypenalty 10000 \postdisplaypenalty 0 % % Set these global demerits % \doublehyphendemerits 1000000 % corresponds to badness 800 \finalhyphendemerits 1000000 % corresponds to badness 1000 % % Allow loose lines rather than overfull lines % \vbadness=9999 \tolerance=9999 % % Allow breaking the page in the middle of a paragraph % \interlinepenalty 0 % % Disallow breaking the page after a hyphenated line \brokenpenalty 10000 % % Hyphenation; don't split words into less than three characters \lefthyphenmin=3 \righthyphenmin=3 % % Float placement parameters % % The total number of floats that can be allowed on a page. \setcounter{totalnumber}{3} % % The maximum number of floats at the top and bottom of a page. \setcounter{topnumber}{5} \setcounter{bottomnumber}{5} % % The maximum part of the top or bottom of a text page that can be % occupied by floats. This is set so that at least four lines of text % fit on the page. \renewcommand\topfraction{.921} \renewcommand\bottomfraction{.921} % The minimum amount of a text page that must be occupied by text. % This should accomodate four lines of text. \renewcommand\textfraction{.13} % The minimum amount of a float page that must be occupied by floats. \renewcommand\floatpagefraction{.887} % The same parameters repeated for double column output \renewcommand\dbltopfraction{.88} \renewcommand\dblfloatpagefraction{.88} % Space between floats \setlength\floatsep{18\p@ \@plus 4\p@ \@minus 2\p@} % Space between floats and text \setlength\textfloatsep{15\p@ \@plus 4\p@ \@minus 2\p@} % Space above and below an inline figure \setlength\intextsep {18\p@ \@plus 4\p@ \@minus 2\p@} % For double column floats \setlength\dblfloatsep {20\p@ \@plus 4\p@ \@minus 2\p@} \setlength\dbltextfloatsep{15\p@ \@plus 4\p@ \@minus 2\p@} \hyphenation{Figure Figures Table Tables Equation Equations Section Sections Appendix Theorem Lemma} % %%%%%%%%%%%%%%%%%%%%%%%%%%% Math Settings %%%%%%%%%%%%%%%%%%%%%%%%%%% % %%%%%%%%%%%%%%%%%%%%%%%%%%%% For above/below spacing \def\eqnarray{% \stepcounter{equation}% \def\@currentlabel{\p@equation\theequation}% \global\@eqnswtrue \m@th \global\@eqcnt\z@ \tabskip\@centering \let\\\@eqncr $$\everycr{}\halign to\displaywidth\bgroup \hskip\@centering$\displaystyle\tabskip\z@skip{##}$\@eqnsel &\global\@eqcnt\@ne\hskip \tw@\arraycolsep \hfil${##}$\hfil &\global\@eqcnt\tw@ \hskip \tw@\arraycolsep $\displaystyle{##}$\hfil\tabskip\@centering &\global\@eqcnt\thr@@ \hb@xt@\z@\bgroup\hss##\egroup \tabskip\z@skip \cr } \def\endeqnarray{% \@@eqncr \egroup \global\advance\c@equation\m@ne $$\@ignoretrue } % %%%%%%%%%%%%%%%%%%%%%%%%%%% Titles %%%%%%%%%%%%%%%%%%%%%%%%%%% % \renewcommand\refname{References}% \renewcommand\figurename{Fig.}% defined as per springer style \renewcommand\tablename{Table}% \renewcommand\appendixname{Appendix}% \renewcommand\abstractname{Abstract}% % %%%%%%%%%%%%%%%%%%%%%%%%%%% Article Front Matter %%%%%%%%%%%%%%%%%%%%%%%%%%% % \def\raggedleft{\leftskip0pt plus 1fil\parfillskip=0pt\relax}% \def\raggedright{\rightskip0pt plus 1fil\parfillskip=0pt\relax}% \def\raggedcenter{\leftskip=0pt plus 0.5fil\rightskip=0pt plus 0.5fil% \parfillskip=0pt\let\hb=\break}% \def\titraggedcenter{\leftskip=12pt plus 0.5fil\rightskip=12pt plus 0.5fil% \parfillskip=0pt\let\hb=\break}% \def\absraggedcenter{\leftskip=24pt plus 0.5fil\rightskip=24pt plus 0.5fil% \parfillskip=0pt\let\hb=\break}% % %%% Font Def \def\Artcatfont{\reset@font\fontsize{8bp}{10bp}\selectfont}% \def\Titlefont{\reset@font\fontsize{17bp}{22.5bp}\selectfont\titraggedcenter}% \def\SubTitlefont{\reset@font\fontsize{14bp}{16.5bp}\selectfont\titraggedcenter}% \def\Authorfont{\reset@font\fontsize{12bp}{14.5bp}\selectfont\boldmath\titraggedcenter}% \def\addressfont{\reset@font\fontsize{11bp}{13.5bp}\selectfont\titraggedcenter}% \def\abstractheadfont{\reset@font\fontsize{9bp}{11bp}\bfseries\selectfont\titraggedcenter}% \def\abstractsubheadfont{\reset@font\fontsize{9bp}{11bp}\bfseries\selectfont}% \def\abstractfont{\reset@font\fontsize{9bp}{11bp}\selectfont\leftskip=24pt\rightskip=24pt\parfillskip=0pt plus 1fil}% \def\keywordfont{\reset@font\fontsize{8bp}{9.5bp}\selectfont\leftskip=24pt\rightskip=24pt plus0.5fill}% \def\historyfont{\reset@font\fontsize{8bp}{9.5bp}\selectfont\leftskip=24pt\rightskip=24pt plus0.5fill}% %% Article Type \newbox\artcatbox% \AtBeginDocument{\definecolor{artcatboxgray}{cmyk}{0.0,0.0,0.0,0.30}}% \def\articletype#1{\if!#1!\else\setbox\artcatbox\hbox{\Artcatfont\hskip1mm#1\hskip1mm}\fi% \gdef\ArtType{\fboxsep=0pt\colorbox{artcatboxgray}{\vbox to 4mm{\vfil% {\raggedright\box\artcatbox}\vfil}}}% \gdef\@ArtType{#1}}% %%\articletype{RESEARCH ARTICLE}% \articletype{}% %% Meta Info %\def\@jyear{{0000}}% %\def\jyear#1{\gdef\@jyear{#1}}% %% Article Title \renewcommand{\title}[2][]{% \gdef\@checktitle{#1}\ifx\@checktitle\empty\gdef\@title{#2}% \gdef\s@title{#2}\else\gdef\@title{#2}\gdef\s@title{#1}\fi% \markboth{\textit{\s@title}}{\textit{\s@title}}}% \def\subtitle#1{\gdef\@subtitle{#1}}\subtitle{}% %% Cross Link for Author & Address \def\jmkLabel#1{\@bsphack\protected@write\@auxout{}{\string\Newlabel{#1}{\@currentlabel}}\@esphack}% \def\Newlabel#1#2{\expandafter\xdef\csname X@#1\endcsname{#2}}% \def\jmkRef#1{\@ifundefined{X@#1}{0}{\csname X@#1\endcsname}}% %% Article Author(s) \let\sep\@empty% \let\authorsep\@empty% \newcount\aucount% \newcount\corraucount% \newcount\punctcount% % \def\artauthors{}% \newif\if@auemail% \newif\if@corauemail% % \def\au@and{\ifnum\punctcount=2\ and\else\unskip, \advance\punctcount by -1 \fi}% % \def\author{\advance\aucount by 1\@ifstar\@@corrauthor\@@author}% % \newcommand{\@@author}[2][]{\def\@authfrstarg{#1}\@corauemailfalse% \g@addto@macro\artauthors{% \ifnum\aucount=1% \global\@auemailtrue% \else% \global\@auemailfalse% \fi% \Authorfont% \def\baselinestretch{1}% \authorsep{#2}\unskip\ifx\@authfrstarg\empty\else\textsuperscript{\smash{{% \@for\@@affmark:=#1\do{\edef\affnum{\@ifundefined{X@\@@affmark}{\@@affmark}{\jmkRef{\@@affmark}}}% \unskip\sep\affnum\let\sep=,}}}}\fi% \def\authorsep{{\au@and} }%%% \global\let\sep\@empty\global\let\@corref\@empty% }}% % \newcommand{\@@corrauthor}[2][]{\def\@authfrstarg{#1}\@corauemailtrue\advance\corraucount by 1% \g@addto@macro\artauthors{% \global\@auemailtrue% \Authorfont% \def\baselinestretch{1}% \authorsep{#2}\unskip\ifx\@authfrstarg\empty\else\textsuperscript{\smash{{% \@for\@@affmark:=#1\do{\edef\affnum{\@ifundefined{X@\@@affmark}{\@@affmark}{\jmkRef{\@@affmark}}}% \unskip\sep\affnum\let\sep=,}}}{*}\hskip-1pt}\fi\unskip% \def\authorsep{\au@and~}%%% \global\let\sep\@empty\global\let\@corref\@empty% }}% %% %% Miscellaneous macros %% %% \def\fnm#1{\leavevmode\hbox{#1}}% \def\sur#1{\unskip~\nobreak\leavevmode\hbox{#1}}% \def\spfx#1{#1}% \def\pfx#1{#1}% \def\sfx#1{#1}% \def\tanm#1{#1}% \def\dgr#1{#1}% % %% Author Email % \let\nomail\relax% \def\corrauthemail{}% \def\authemail{}% \newcount\emailcnt% \def\email#1{\global\advance\emailcnt by 1\relax% \if@corauemail% \g@addto@macro\corrauthemail{% \setcounter{footnote}{0}% \textcolor{blue}{#1};\ % }% \else% \g@addto@macro\authemail{% \setcounter{footnote}{0}% \textcolor{blue}{#1};\ % }% \fi} %% Corrseponding Address \def\@copycorthanks{}% \def\auaddress{}% \def\@auaddress{}% \newcounter{affn}% \newcount\addcount% To check the count of address \renewcommand\theaffn{\arabic{affn}}% \def\affil{\advance\addcount by 1\@ifstar\@@coraddress\@@address}% \newcommand{\@@coraddress}[2][]{%\advance\addcount by 1 \g@addto@macro\auaddress{% \stepcounter{affn}% \xdef\@currentlabel{\theaffn}% \jmkLabel{\theaffn}% {\textsuperscript{#1*}#2.\par} } } %% Macros for present address \newif\ifpresentaddress% \def\@presentaddresstxt{}% \def\presentaddresstxt#1{\gdef\@presentaddresstxt{#1:}}\presentaddresstxt{Present Address}% \newcommand{\presentaddress}[1]{\gdef\@presentaddresstext{\@presentaddresstxt\par#1}\global\presentaddresstrue}% %% Macros for equally contributed \newif\ifequalcont% %\def\@equalconttxt{}% %\def\equalcontxt#1{\gdef\@equalconttxt{#1}}\equalcontxt{These authors contributed equally to this work.}% %\newcommand{\equalcont}[1][\@equalconttxt]{\gdef\@equalconttext{#1}\g@addto@macro\artauthors{$^{\dagger}$}\global\equalconttrue}% \def\@equalconttxt{}% \def\equalcontxt#1{\gdef\@equalconttxt{#1}}\equalcontxt{}% \newcommand{\equalcont}[1]{\gdef\@equalconttext{#1}\g@addto@macro\artauthors{$^{\dagger}$}\global\equalconttrue}% %% Author Address \newcommand{\@@address}[2][]{%%\advance\addcount by 1 \g@addto@macro\auaddress{% \stepcounter{affn}% \xdef\@currentlabel{\theaffn}% \jmkLabel{\theaffn}% {\textsuperscript{#1}#2.\par} }%\theaffn } %% Address tagging \newcommand{\orgdiv}[1]{#1}% \newcommand{\orgname}[1]{#1}% \newcommand{\orgaddress}[1]{#1}% \newcommand{\street}[1]{#1}% \newcommand{\postcode}[1]{#1}% \newcommand{\city}[1]{#1}% \newcommand{\state}[1]{#1}% \newcommand{\country}[1]{#1}% %% Article notes \def\@artnote{}% \def\artnote#1{\gdef\@artnote{#1}}% %% Miscellaneous notes \def\@miscnote{}% \def\miscnote#1{\gdef\@miscnote{\par\addvspace{3pt}#1}}% %% Motto \def\mottofont{\reset@font\fontfamily{\rmdefault}\fontsize{8.5bp}{10bp}\fontshape{it}\selectfont\raggedright} % \let\@motto\@empty \def\mottoraggedright{\rightskip0mm\leftskip=42mm plus 1fil\parfillskip=0pt\relax}% \newcommand{\motto}[2][]{\gdef\@headcheck{#1}\gdef\@motto{\@headcheck\ifx\@headcheck\@empty\vskip12pt\else\fi{\mottofont\mottoraggedright#2\par}}} %% Article Abstract \newcommand\abstracthead{\@startsection {section}{1}{\z@}{-22pt \@plus0ex \@minus0ex}{3pt}{\abstractheadfont}} \newcommand\subabstracthead{\@startsection{subsection}{2}{\z@}{3pt \@plus0ex \@minus0ex}{-.5em}{\abstractsubheadfont}} \def\@abstract{}% \long\def\abstract#1{\def\@abstract{% \let\paragraph\subabstracthead% \abstractfont% \abstracthead*{\abstractname}% #1\par}}% \def\printabstract{\ifx\@abstract\empty\else\@abstract\fi\par}% \def\printkeywords{\ifx\@keywords\empty\else\@keywords\fi\par}% % %% Keywords \def\keywordname{Keywords}% \def\keywords#1{\ifx#1\empty\else\def\@keywords{\par\addvspace{10pt}{\keywordfont{\bfseries\keywordname:} #1\par}}\fi}% \def\@keywords{}% %% PACs \def\pacsbullet{\hbox{\hskip2.5pt,\hskip2.5pt}}% \def\change@commas#1,#2{% \ifx#2\@empty% #1% \else% #1\nobreak\hbox{\pacsbullet}\allowbreak\expandafter\change@commas% \fi% #2}% \newcommand\keywordhead[1]{\par\addvspace{10pt}% {{\keywordfont\bfseries#1:\ }}}% \newcommand{\pacs}[1]{\keywordhead{\pacsname}#1}% % \newcount\PacsCount% \PacsCount=0% % \newcount\PacsTmpCnt% \PacsTmpCnt=1% % \gdef\StorePacsText#1#2{% \edef\GetRoman{\romannumeral#1}% \expandafter\gdef\csname\GetRoman StorePacsTxt\endcsname{#2}% }% % \let\oldpacs\pacs% \renewcommand\pacs[2][PAC Codes]{\gdef\pacsname{{\bfseries#1}}\gdef\@pacs{\keywordfont\raggedright\oldpacs\change@commas#2,\@empty\par} \StepUpCounter{\PacsCount}% \StorePacsText{\the\PacsCount}{\gdef\pacsname{{\bfseries#1}}\keywordfont\raggedright\oldpacs\change@commas#2,\@empty}% }% \def\@pacs{}% %% Glossary \def\gloshead{Glossary}% \newenvironment{glos}[1][\gloshead]{\begingroup\parindent=0pt% \section*{#1} \def\item[##1]{##1,\ }}{% \endgroup}% % %% Article History \def\received#1{\g@addto@macro\@history{{Received #1}}}% \def\revised#1{\g@addto@macro\@history{{; revised #1}}}% \def\accepted#1{\g@addto@macro\@history{{; accepted #1}}}% %% Remark on Front page %% \newdimen\FMremarkdim% \newcommand{\FMremark}{\begingroup\parindent=0pt\parskip=0pt% \if@referee\singlespacing\fi% \fboxsep=6pt\fboxrule=0.5pt% \FMremarkdim=\textwidth%%\paperwidth% \advance\FMremarkdim-\fboxsep% \advance\FMremarkdim-2\fboxrule% \if@referee\vskip-21pt\fi% %%\fbox{\vbox{\hsize=\FMremarkdim\small% \unvbox\fmremarkbox %%}}% \endgroup} \newbox\fmremarkbox% \newenvironment{fmremark}{\begingroup\parindent=0pt% \fboxsep=6pt\fboxrule=0.5pt% \FMremarkdim=\textwidth%%\paperwidth% \advance\FMremarkdim-\fboxsep% \advance\FMremarkdim-2\fboxrule% \global\setbox\fmremarkbox\vbox\bgroup\small% }{\egroup\endgroup} %% Article Header Definition \renewcommand{\@maketitle}{\newpage\null% \if@remarkboxon\vbox to 0pt{\vspace*{-78pt}\hspace*{-18pt}\FMremark}\else\vskip21pt\fi%%\par% \hsize\textwidth\parindent0pt%%%\vskip7pt% %% Aritle Type {\hbox to \textwidth{{\Artcatfont\ArtType\hfill}\par}} %% Aritle Title \ifx\@title\empty\else% \removelastskip\vskip20pt\nointerlineskip% {\Titlefont\@title\par} %\addcontentsline{toc}{chapter}{\@title}% for bookmarks \fi% %% Aritle SubTitle \ifx\@subtitle\empty\else% \vskip9pt% {{\SubTitlefont\@subtitle\par}} \fi% %% Aritle Authors, Address and Correspondings \ifnum\aucount>0 \global\punctcount\aucount% \vskip20pt% \artauthors\par%% authors and emails {\vskip7pt\addressfont\auaddress\par%% corresponding adress \removelastskip\vskip24pt% \ifnum\emailcnt>0\relax% \ifx\corrauthemail\@empty\else{\ifnum\aucount>1*\fi}% Corresponding author(s). E-mail(s): \corrauthemail\par\fi% \ifx\authemail\@empty\else Contributing authors:\ \authemail\fi% \fi% \ifequalcont{\par$^{\dagger}$\@equalconttext\par}\fi% \removelastskip\vskip24pt% \ifpresentaddress{\par\@presentaddresstext\par}\fi% } \fi% {\printabstract\par}% {\printkeywords\par}% \ifx\@pacs\empty\else% \loop\ifnum\PacsCount>0% \csname\romannumeral\PacsTmpCnt StorePacsTxt\endcsname\par% \StepDownCounter{\PacsCount}% \StepUpCounter{\PacsTmpCnt}% \repeat% \fi% %%{\printhistory\par}% %%{\ifx\@motto\empty\else\@motto\fi}% \removelastskip\vskip36pt\vskip0pt}% \usepackage{cuted}% \@ifpackageloaded{cuted}{\gdef\@setmarks{}}{}% %% Printing Article Header \newdimen\firstpagehtcheck \renewcommand\maketitle{\par \@afterindentfalse% \begingroup \gdef\UrlFont{\rmfamily}% \renewcommand\thefootnote{\@fnsymbol\c@footnote}% \def\@makefnmark{\rlap{\@textsuperscript{\normalfont\smash{\@thefnmark}}}}% \long\def\@makefntext##1{\parindent 1em\noindent\small\selectfont \hbox{\@textsuperscript{\normalfont\@thefnmark}}##1}% \if@twocolumn \ifnum \col@number=\@ne% \setbox0=\vbox{\@maketitle} \firstpagehtcheck=\ht0% \advance\firstpagehtcheck by \dp0% \ifdim\firstpagehtcheck>\textheight% \setbox1=\vsplit0to2\textheight% \setbox1=\vbox{\unvbox1}% \setbox2=\vbox{\unvbox0}% \unvbox1% \stripsep=0pt% \begin{strip} \unvbox2% \end{strip} \else \twocolumn[\@maketitle]% \fi \else \@maketitle \fi% \else% \newpage% \global\@topnum\z@% Prevents figures from going at top of page. \@maketitle% \fi% \endgroup% \ifx\@artnote\@empty\else\footnoteA{\@artnote}\fi% \ifx\@miscnote\@empty\else\footnoteA{\@miscnote\par}\fi% \setcounter{footnote}{0}% \global\let\thanks\relax% \global\let\artnote\relax% \global\let\maketitle\relax% \global\let\@maketitle\relax% \global\let\@thanks\@empty% \global\let\@author\@empty% \global\let\@date\@empty% \global\let\title\relax% \global\let\author\relax% \global\let\date\relax% \global\let\and\relax% \pagestyle{headings}% %%%print continuous abstract on next page \@afterheading% %%\vskip-18pt% this is included to avoid vertical space at the beginning of left column on article opening pages }% % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Page Styles %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % % \def\opheaderfont{\reset@font\fontsize{10bp}{0bp}\selectfont}% \def\headerfont{\reset@font\fontsize{10bp}{0bp}\selectfont}% \def\footerfont{\reset@font\fontsize{10bp}{0bp}\selectfont}% %% Regular Page Style \def\ps@headings{% \def\@oddfoot{\hfill\thepage\hfill}% \let\@evenfoot\@oddfoot% \def\@evenhead{% \vbox to 0pt{\vspace*{-48pt}% \hbox to \hsize{\hfill \relax\hfill}}\par%% \hspace*{-\textwidth}\hbox to \hsize{\hfill}}% \def\@oddhead{% \vbox to 0pt{\vspace*{-48pt}% \hbox to \hsize{\hfill \relax\hfill}}\par%% \hspace*{-\textwidth}\hbox to \hsize{\hfill}}% \let\@mkboth\markboth% }% %\newdimen\opshortpage% %\def\printcopyright#1{#1}%% %\gdef\@copyrighttext{}% %\gdef\@copyrightyear{\@jyear}% %\def\copytext#1#2{\gdef\@copyrightyear{#2}\def\@copyrighttext{\begin{minipage}[t]{\textwidth}\footerfont\textcopyright\ #1\ \@copyrightyear\end{minipage}}} %\copytext{Springer Science+Business Media B.V.}{\@jyear}% %\def\@opjournalheader{\undef\leftmark\space\ {{(\@jyear),\ \textbf{\@jvol}:\@artid}} {\thepage{--}\pageref*{LastPage}}\\ %{\@DOI}}% %% Opening Page Style \def\ps@titlepage{% %%\def\@oddhead{\vbox{\vskip-36pt\hbox to \textwidth{\hfill\includegraphics{springer-nature-logo}\hspace*{-1pt}}}}% %%\let\@oddhead\@empty\let\@evenhead\@empty% \def\@oddhead{% \vbox to 0pt{\vspace*{-38pt}% \hbox to \hsize{\hfill \hfill}}}%% \let\@evenhead\@oddhead% \def\@oddfoot{\vbox to 18pt{\vfill\reset@font\rmfamily\hfil\thepage\hfil}}%% \def\@evenfoot{}}% \def\ps@plain{\let\@mkboth\@gobbletwo% \let\@oddhead\@empty\let\@evenhead\@empty% \def\@oddfoot{\vbox to 18pt{\vfill\reset@font\rmfamily\hfil ddd\thepage\hfil}}% \let\@evenfoot\@oddfoot}% % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Sections %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \def\numbered{\setcounter{secnumdepth}{3}}% \def\unnumbered{\setcounter{secnumdepth}{0}}% \numbered%% default is numbered Sections \renewcommand\thesection {\@arabic\c@section}% \renewcommand\thesubsection {\thesection.\@arabic\c@subsection}% \renewcommand\thesubsubsection{\thesubsection.\@arabic\c@subsubsection}% \renewcommand\theparagraph {\thesubsubsection.\@arabic\c@paragraph}% \renewcommand\thesubparagraph {\theparagraph.\@arabic\c@subparagraph}% %% \def\@seccntformat#1{\csname the#1\endcsname\hskip.5em}% \def\@sect#1#2#3#4#5#6[#7]#8{% \ifnum #2>\c@secnumdepth \let\@svsec\@empty \else \refstepcounter{#1}% \protected@edef\@svsec{\@seccntformat{#1}\relax}% \fi \@tempskipa #5\relax \ifdim \@tempskipa>\z@ \begingroup #6{% \@hangfrom{\hskip #3\relax\@svsec}% \interlinepenalty \@M #8\@@par}% \endgroup \csname #1mark\endcsname{#7}% \addcontentsline{toc}{#1}{% \ifnum #2>\c@secnumdepth \else \protect\numberline{\csname the#1\endcsname}% \fi #7}% \else \def\@svsechd{% #6{\hskip #3\relax \@svsec #8.}% \csname #1mark\endcsname{#7}% \addcontentsline{toc}{#1}{% \ifnum #2>\c@secnumdepth \else \protect\numberline{\csname the#1\endcsname}% \fi #7}}% \fi \@xsect{#5}} % \def\sectionfont{\reset@font\fontfamily{\rmdefault}\fontsize{14bp}{16bp}\bfseries\selectfont\raggedright\boldmath}% \def\subsectionfont{\reset@font\fontfamily{\rmdefault}\fontsize{12bp}{14bp}\bfseries\selectfont\raggedright\boldmath}% \def\subsubsectionfont{\reset@font\fontsize{11bp}{13bp}\bfseries\selectfont\raggedright\boldmath}% \def\paragraphfont{\reset@font\fontsize{10bp}{12bp}\bfseries\itshape\selectfont\raggedright}% % \def\subparagraphfont{\itshape}% \def\bmheadfont{\reset@font\fontfamily{\rmdefault}\fontsize{10bp}{12bp}\bfseries\selectfont\raggedright\boldmath}% % \renewcommand\section{\@startsection{section}{1}{\z@}% {-12pt \@plus -4pt \@minus -2pt}% {9pt}% {\sectionfont}} \renewcommand\subsection{\@startsection{subsection}{2}{\z@}% {-12pt \@plus -4pt \@minus -2pt}% {6pt}% {\subsectionfont}} \renewcommand\subsubsection{\@startsection{subsubsection}{3}{\z@}% {-12pt \@plus -4pt \@minus -2pt}% {6pt}% {\subsubsectionfont}} \renewcommand\paragraph{\@startsection{paragraph}{4}{\z@}% {-12pt \@plus -4pt \@minus-2pt}% {3pt}% {\paragraphfont}} \renewcommand\subparagraph{\@startsection{subparagraph}{5}{\z@}% {6pt \@plus1ex \@minus.2ex}% {-1em}% {\subparagraphfont}} \newcommand\bmhead{\@startsection{subparagraph}{5}{\z@}% {6pt \@plus1ex \@minus .2ex}% {-1em}% {\bmheadfont}} % \def\@startsection#1#2#3#4#5#6{% \if@noskipsec \leavevmode \fi \par \@tempskipa #4\relax \@afterindenttrue \ifdim \@tempskipa <\z@ \@tempskipa -\@tempskipa \@afterindentfalse \fi \if@nobreak \everypar{}% \else \addpenalty\@secpenalty\addvspace\@tempskipa \fi \@ifstar {\@ssect{#3}{#4}{#5}{#6}}% {\@dblarg{\@sect{#1}{#2}{#3}{#4}{#5}{#6}}}} % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Lists %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \newdimen\labelwidthi% \newdimen\labelwidthii% \newdimen\labelwidthiii% \newdimen\labelwidthiv% \def\normal@labelsep{0.5em}% \labelsep\normal@labelsep% \settowidth{\labelwidthi}{(iii)}% \settowidth{\labelwidthii}{(d)}% \settowidth{\labelwidthiii}{(iii)}% \settowidth{\labelwidthiv}{(M)}% \leftmargini\labelwidthi \advance\leftmargini\labelsep \leftmarginii\labelwidthii \advance\leftmarginii\labelsep \leftmarginiii\labelwidthiii \advance\leftmarginiii\labelsep \leftmarginiv\labelwidthiv \advance\leftmarginiv\labelsep \def\setleftmargin#1#2{\settowidth{\@tempdima}{#2}\labelsep\normal@labelsep \csname labelwidth#1\endcsname\@tempdima \@tempdimb\@tempdima \advance\@tempdimb\labelsep \csname leftmargin#1\endcsname\@tempdimb} \def\@listI{\leftmargin\leftmargini \labelwidth\labelwidthi \labelsep\normal@labelsep \topsep \z@ \partopsep\z@ \parsep\z@ \itemsep\z@ \listparindent 1em} \def\@listii{\leftmargin\leftmarginii \labelwidth\labelwidthii \labelsep\normal@labelsep \topsep\z@ \partopsep\z@ \parsep\z@ \itemsep\z@ \listparindent 1em} \def\@listiii{\leftmargin\leftmarginiii \labelwidth\labelwidthiii \labelsep\normal@labelsep \topsep\z@ \partopsep\z@ \parsep\z@ \itemsep\z@ \listparindent 1em} \def\@listiv{\leftmargin\leftmarginiv \labelwidth\labelwidthiv \labelsep\normal@labelsep \topsep\z@ \partopsep\z@ \parsep\z@ \itemsep\z@ \listparindent 1em} \let\@listi\@listI \@listi % \setlength \labelsep {.5em} \setlength \labelwidth{\leftmargini} \addtolength\labelwidth{-\labelsep} \@beginparpenalty -\@lowpenalty \@endparpenalty -\@lowpenalty \@itempenalty -\@lowpenalty \def\labelitemi{$\bullet$} \def\labelitemii{$\cdot$} \def\labelenumi{\theenumi.} \def\theenumi{\arabic{enumi}} \def\labelenumii{(\alph{enumii})} \def\theenumii{\alph{enumii}} \def\labelenumiii{(\roman{enumiii})}\def\theenumiii{\roman{enumiii}} \def\labelenumiv{(\Alph{enumiv})} \def\theenumiv{\Alph{enumiv}} % %%%%%%%%%%%%%%%%%%%%%%%%%%% Ordered & Unordered List %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \def\listfont{\normalsize}% % \def\enumargs{% \listfont% \leftmargini0pt% \leftmarginii0pt% \leftmarginiii0pt% \ifnum\@enumdepth=3\topsep0pt\else\ifnum\@enumdepth=2\topsep0pt\else\topsep 6pt\fi\fi% \partopsep \z@% \itemsep \z@% \parsep \z@% \labelsep 0.5em% \rightmargin \z@% \raggedright% \listparindent \parindent% \itemindent \z@}% \def\enumerate{% \@ifnextchar[{\@numerate}{\@numerate[0.]}} \def\@numerate[#1]{\par% \ifnum \@enumdepth >3 \@toodeep\else \advance\@enumdepth \@ne \edef\@enumctr{enum\romannumeral\the\@enumdepth} \list{\csname label\@enumctr\endcsname}{% \enumargs% \setlength{\leftmargin}{\csname leftmargin\romannumeral\the\@enumdepth\endcsname} \usecounter{\@enumctr} \settowidth\labelwidth{#1} \addtolength{\leftmargin}{\labelwidth} \addtolength{\leftmargin}{\labelsep} \def\makelabel##1{\hss\llap{##1}}}% \fi } \let\endenumerate\endlist %%Unnumbered list%% \def\unenumargs{% \listfont% \leftmargini\parindent% \topsep6pt% \partopsep \z@% \itemsep \z@% \parsep \z@% \labelsep 0\p@% \rightmargin \z@% \raggedright% \listparindent \parindent% \itemindent -12pt}% \def\unenumerate{% \@ifnextchar[{\@unenumerate}{\@unenumerate[0.]}} \def\@unenumerate[#1]{\par% \ifnum \@enumdepth >3 \@toodeep\else \advance\@enumdepth \@ne \edef\@enumctr{enum\romannumeral\the\@enumdepth} \list{}{% \unenumargs \setlength{\leftmargin}{\csname leftmargin\romannumeral\the\@enumdepth\endcsname} \usecounter{\@enumctr} \settowidth\labelwidth{#1} \addtolength{\leftmargin}{0pt} \addtolength{\leftmargin}{0pt} \def\makelabel##1{\hss\llap{##1}}}% \fi } \let\endunenumerate\endlist% %% bulleted list \def\itemargs{% \listfont% \leftmargini0pt% \leftmarginii0pt% \ifnum\@enumdepth=3\topsep0pt\else\ifnum\@enumdepth=2\topsep0pt\else\topsep 6pt\fi\fi% \partopsep \z@% \itemsep \z@% \parsep \z@% \labelsep 0.5em% \rightmargin \z@% \raggedright% \listparindent \z@% \itemindent \z@}% \renewcommand\labelitemi{\raise1pt\hbox{\textbullet}}% \renewcommand\labelitemii{\textendash}% \def\itemize{% \@ifnextchar[{\@itemize}{\@itemize[$\bullet$]}} \def\@itemize[#1]{\par% \ifnum \@itemdepth >3 \@toodeep\else \advance\@itemdepth \@ne \edef\@itemctr{item\romannumeral\the\@itemdepth} \list{\csname label\@itemctr\endcsname}{% \itemargs \setlength{\leftmargin}{\csname leftmargin\romannumeral\the\@itemdepth\endcsname} \settowidth\labelwidth{#1} \addtolength{\leftmargin}{\labelwidth} \addtolength{\leftmargin}{\labelsep} \def\makelabel##1{\hss \llap{##1}}}% \fi } \let\enditemize\endlist % \def\quote{\list{}{\itemindent\z@ \leftmargin 1em \rightmargin \z@}% \item[]} \let\endquote\endlist % \def\descriptionlabel#1{\hspace\labelsep \itshape #1} \def\description{\list{}{\labelwidth\z@ \leftmargin \z@ \topsep6pt\itemindent \z@ %-\leftmargin \let\makelabel\descriptionlabel}} \let\enddescription\endlist % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Float %%%%%%%%%%%%%%%%%%%%%%%%%%%% \setlength\abovecaptionskip{2.25\p@}% \setlength\belowcaptionskip{6\p@}% \setlength\arraycolsep{2\p@}% \setlength\tabcolsep{6\p@}% \setlength\arrayrulewidth{.4\p@}% \setlength\doublerulesep{2\p@}% \setlength\tabbingsep{\labelsep}% \def\fnum@figure{{\bfseries\figurename\space\thefigure}}% \def\fnum@table{{\bfseries\tablename\space\thetable}}% \def\FigName{figure}% \long\def\@makecaption#1#2{% \ifx\FigName\@captype \vskip\abovecaptionskip \@figurecaption{#1}{#2} \else \@tablecaption{#1}{#2} \vskip\belowcaptionskip \fi% } %% Figure \def\figurecaptionfont{\reset@font\fontfamily{\rmdefault}\fontsize{8}{9.5}\selectfont}% \newdimen\figwidth% \newdimen\figheight% \newdimen\sidecapwidth \newdimen\wrapcapline% \newdimen\totalwrapline% \newdimen\wraptotline% %% Figures macro \newbox\figurebox% \newbox\wrapfigcapbox \def\FIG#1#2{% \setbox\figurebox\hbox{#1}% %% Figure dimensions \figwidth\wd\figurebox% \figheight\ht\figurebox% {\parbox{\hsize}{% \centerline{\box\figurebox}% %% Caption #2}}} %% Figures caption \newbox\figcapbox \newbox\capbox \long\def\@figurecaption#1#2{{\figurecaptionfont{\bfseries#1}\hskip.7em#2\par}}% \newenvironment{unnumfigure}{\begingroup\setlength{\topsep}{12pt}% \begin{center}}{\end{center}\endgroup} % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \@ifpackageloaded{booktabs}{\cmidrulewidth=.15pt}{}% % \def\tablecaptionfont{\reset@font\fontsize{8bp}{9.5bp}\selectfont}% \def\tablebodyfont{\reset@font\fontsize{8bp}{9.5bp}\selectfont}% \def\tablecolheadfont{\reset@font\fontsize{8bp}{9.5bp}\selectfont\bfseries\boldmath}% \def\tablefootnotefont{\reset@font\fontsize{8bp}{9.5bp}\selectfont}% %% Table Macro \newskip\headwidthskip% \def\tabraggedcenter{\leftskip=0pt plus 0.5fil\rightskip=0pt plus 0.5fil\parfillskip=0pt}% \newenvironment{@processtable}[4]{% \setbox4=\hbox to \hsize{\hss% \begin{minipage}[t]{#4}% \tabraggedcenter% \caption{#1}\par% {\tablebodyfont\noindent\ignorespaces#2\par}\par\vglue6pt% {\if!#3!\else{\tablefootnotefont#3}\fi}% \end{minipage}% \hss}% \box4\par}% \newcommand\TBL[3]{\begingroup% % \if!#1!\let\caption\relax\fi% % \global\setbox\temptbox=\hbox{\bgroup{\tablebodyfont#2}\egroup}% \global\tempdime\wd\temptbox% \@processtable{#1}{\global\headwidthskip=\tempdime% \vbox{#2}}{#3}{\tempdime}% \endgroup}% %% Table Caption \newbox\tabcapbox% \newbox\temptbox% \newdimen\tempdime% \newdimen\tabhtdime% \long\def\@tablecaption#1#2{% \setbox\tabcapbox\vbox{\tablecaptionfont\raggedright% {\bfseries #1}{\hskip2mm}#2\vphantom{y}\par}% \box\tabcapbox% } %% Table Column Heads \def\TCH#1{{\tablecolheadfont #1}} %% Table Footnotes \newenvironment{tablenotes}{\list{}{\setlength{\labelsep}{0pt}% \setlength{\labelwidth}{0pt}% \setlength{\leftmargin}{0pt}% \setlength{\rightmargin}{0pt}% \setlength{\topsep}{-6pt}% \setlength{\itemsep}{2pt}% \setlength{\partopsep}{0pt}% \setlength{\listparindent}{0em}% \setlength{\parsep}{0pt}}% \item\relax% }{\endlist}% \def\tnote#1{$^{#1}$}%% %% Table Rules \def\toprule{%\noalign{\vskip3pt} \noalign{\ifnum0=`}\fi \hrule \@height 0\p@ \@width 0pt \hrule \@height 0.75\p@ % <- rule height \hrule \@height 5pt \@width 0pt \futurelet\@tempa\@xhline} % Middle rule \def\midrule{\noalign{\ifnum0=`}\fi% \hrule \@height 3pt \@width 0pt \hrule \@height .5pt % <- rule height \hrule \@height 5pt \@width 0pt \futurelet \@tempa\@xhline} % Bottom rule \def\botrule{\noalign{\ifnum0=`}\fi \hrule \@height 3pt \@width 0pt \hrule \@height 0.75\p@ % <- rule height \hrule \@height 3pt \@width 0pt \futurelet\@tempa\@xhline} % \def\@@@cmidrule[#1-#2]#3#4{\global\@cmidla#1\relax \global\advance\@cmidla\m@ne \ifnum\@cmidla>0\global\let\@gtempa\@cmidrulea\else \global\let\@gtempa\@cmidruleb\fi \global\@cmidlb#2\relax \global\advance\@cmidlb-\@cmidla \global\@thisrulewidth=#3 \@setrulekerning{#4} \ifnum\@lastruleclass=\z@\vskip 3\p@\fi \ifnum0=`{\fi}\@gtempa \noalign{\ifnum0=`}\fi\futurenonspacelet\@tempa\@xcmidrule} \def\@xcmidrule{% \ifx\@tempa\cmidrule \vskip-\@thisrulewidth \global\@lastruleclass=\@ne \else \ifx\@tempa\morecmidrules \vskip \cmidrulesep \global\@lastruleclass=\@ne\else \vskip 5\p@ \global\@lastruleclass=\z@ \fi\fi \ifnum0=`{\fi}} \let\cline\cmidrule \usepackage[figuresright]{rotating}% \usepackage{threeparttable} \let\tableorg\table% \let\endtableorg\endtable% \let\sidewaystableorg\sidewaystable% \let\endsidewaystableorg\endsidewaystable% \renewenvironment{table}[1][]% {\begin{tableorg}[#1]% \begin{center} \begin{threeparttable} \tablebodyfont% \renewcommand\footnotetext[2][]{{\removelastskip\vskip3pt% \let\tablebodyfont\tablefootnotefont% \hskip0pt\if!##1!\else{\smash{$^{##1}$}}\fi##2\par}}% }{\end{threeparttable}\end{center}\end{tableorg}} \renewenvironment{sidewaystable}[1][]% {\begin{sidewaystableorg}[#1]% \begin{center} \begin{threeparttable} \tablebodyfont% \renewcommand\footnotetext[2][]{{\removelastskip\vskip3pt% \let\tablebodyfont\tablefootnotefont% \hskip0pt\if!##1!\else{\smash{$^{##1}$}}\fi##2\par}}% }{\end{threeparttable}\end{center}\end{sidewaystableorg}} %%%%%%%%%%%%%%%%%%%%%%%%%%%% Other Env. %%%%%%%%%%%%%%%%%%%%%%%%% \def\quotefont{\reset@font\fontfamily{\rmdefault}\fontsize{9}{11}\selectfont}% \renewenvironment{quote} {\list{}{\topsep=0pt\topsep6pt\leftmargin=1em\raggedright\quotefont}% \item\relax} {\endlist} % %%%%%%%%%%%%%%%%%%%%%%%%%%%% Appendix %%%%%%%%%%%%%%%%%%%%%%%%% % \newif\ifbackmatter% \newcommand{\backmatter}{\global\backmattertrue}% \usepackage[title]{appendix}% \@ifpackageloaded{appendix}{% % \renewenvironment{appendices}{% \@resets@pp \if@dotoc@pp \if@dopage@pp % both page and toc \if@chapter@pp % chapters \clear@ppage \fi \appendixpage \else % toc only \if@chapter@pp % chapters \clear@ppage \fi \addappheadtotoc \fi \else \if@dopage@pp % page only \appendixpage \fi \fi \if@chapter@pp \if@dotitletoc@pp \@redotocentry@pp{chapter} \fi \else \if@dotitletoc@pp \@redotocentry@pp{section} \fi \if@dohead@pp \def\sectionmark##1{% \if@twoside \markboth{\@formatsecmark@pp{##1}}{} \else \markright{\@formatsecmark@pp{##1}}{} \fi} \fi \if@dotitle@pp \def\sectionname{\appendixname} \def\@seccntformat##1{\@ifundefined{##1name}{}{\csname ##1name\endcsname\ }% \csname the##1\endcsname\quad} \fi \fi }{% \@ppsaveapp\@pprestoresec} %% \AtBeginDocument{% % \let\oldappendices\appendices% \let\oldendappendices\endappendices% %% \renewenvironment{appendices}{% \setcounter{figure}{0}% \setcounter{table}{0}% \setcounter{equation}{0}% %% \begin{oldappendices}% \gdef\thefigure{\@Alph\c@section\arabic{figure}}% \gdef\thetable{\@Alph\c@section\arabic{table}}% \gdef\theequation{\@Alph\c@section\arabic{equation}}% }{\end{oldappendices}} } %% }{} % %%%%%%%%%%%%%%%%%%%%%%%%%%% Article History %%%%%%%%%%%%%%%%%%%% % \def\@history{} \def\printhistory{{\par\addvspace{8pt}% \historyfont\noindent% \ifx\@history\empty\gdef\@history{Received xx xxx xxxx}\fi\@history\par}}% % %%%%%%%%%%%%%%%%%%%%%%% Footnotes %%%%%%%%%%%%%%%%%%%%%%%%%%%%% % % \renewcommand\@makefntext[1]{% \hskip8pt{\smash{\@makefnmark}}#1} % \RequirePackage{hyperref}% %%\RequirePackage{hypcap}% \gdef\breakurldefns{% \if@pdflatex\else% \RequirePackage[hyphenbreaks]{breakurl}% % \let\href\burlalt% \fi}% \breakurldefns% % \bgroup % \catcode`\&=12\relax % \hyper@normalise\burl@addtocharlistbefore{%} % \hyper@normalise\burl@addtocharlistafter{:/.?#&_,;!=+~}%% for extra breaks in url % \egroup % \burl@defifstructure % \hypersetup{% colorlinks, breaklinks=true, plainpages=false,% citecolor=blue, linkcolor=blue, urlcolor=blue, bookmarksopen=true,% bookmarksnumbered=false,% bookmarksdepth=5% } % \AtBeginDocument{\renewcommand\UrlFont{\rmfamily}}% % \AtBeginDocument{% \@ifpackageloaded{natbib}{% \renewcommand\bibsection{% \section*{\refname}% }% }{}% }% % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \pagestyle{headings}% \pagenumbering{arabic}% \sloppy% \frenchspacing% \flushbottom% %%% special parameters for TeX \adjdemerits=100 \linepenalty=100 % %%%%%%%%%%%%%%% Biography % \RequirePackage{wrapfig}% % % % \begin{wrapfigure}[12]{r}[34pt]{5cm}
\end{wrapfigure} % -- - ---- --- % [number of narrow lines] {placement} [overhang] {width of figure} \newcount\wraplines% %%\wraplines=5% % \newbox\@authorfigbox% \newskip\@authorfigboxdim% % \newskip\biofigadjskip% \biofigadjskip=0pt% % \def\authbiotextfont{\reset@font\fontsize{8bp}{9.5bp}\selectfont}% % \newenvironment{biography}[2]{\par\addvspace{11.5pt plus3.375pt minus1.6875pt}%\lineno@off% \def\author##1{{\bfseries##1}}% \if!#1!\def\@authorfig{}\else\def\@authorfig{{#1}}\fi% \setbox\@authorfigbox=\hbox{#1}% \@authorfigboxdim=\wd\@authorfigbox% \if@iicol\advance\@authorfigboxdim by -10pt\else\advance\@authorfigboxdim by -2pt\fi% \wraplines=9\fboxrule=1pt\fboxsep=6pt% \noindent{% \ifx\@authorfig\@empty\else\unskip% \begin{wrapfigure}[\wraplines]{l}[0pt]{\@authorfigboxdim}%{38.25mm}% \vskip-19pt\addvspace{\biofigadjskip}% \@authorfig% \end{wrapfigure}% \fi% {\authbiotextfont#2\par}% \par% }}{\par\addvspace{10.5pt plus3.375pt minus1.6875pt}} % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Theorem %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % % \@ifpackageloaded{amsthm}{% % %\let\proof\relax% %\let\endproof\relax% \def\@begintheorem#1#2[#3]{% \deferred@thm@head{\the\thm@headfont \thm@indent \@ifempty{#1}{\let\thmname\@gobble}{\let\thmname\@iden}% \@ifempty{#2}{\let\thmnumber\@gobble}{\let\thmnumber\@iden}% \@ifempty{#3}{\let\thmnote\@gobble}{\let\thmnote\@iden}% \thm@swap\swappedhead\thmhead{#1}{#2}{#3}% \the\thm@headpunct \thmheadnl % possibly a newline. \hskip\thm@headsep }% \ignorespaces } \def\@endtheorem{\endtrivlist\@endpefalse} \AtBeginDocument{% % \DeclareRobustCommand{\S}{\ifmmode\mathsection\else\textsection\fi} \DeclareSymbolFont{AMSa}{U}{msa}{m}{n}% \DeclareMathSymbol{\opensquare}{\mathord}{AMSa}{"03}% \def\qedsymbol{\ensuremath{\opensquare}}% % \newenvironment{spiproof}[1][\proofname]{\par\removelastskip%\vspace*{2pt}% \pushQED{\qed}% \small\normalfont \topsep7.5\p@\@plus7.5\p@\relax% \trivlist% \item[\hskip\labelsep% \itshape% #1\@addpunct{}]\ignorespaces% }{% \popQED\endtrivlist\@endpefalse% }% % \let\proof\spiproof\let\endproof\endspiproof% % }% % \def\thm@space@setup{% \thm@preskip=12pt% \thm@postskip=12pt} % %%%%%%%%%%%%%%%%%% StyleOne % \newtheoremstyle{thmstyleone}% Numbered {18pt plus2pt minus1pt}% Space above {18pt plus2pt minus1pt}% Space below {\small\itshape}% Body font {0pt}% Indent amount {\small\bfseries}% Theorem head font {}% Punctuation after theorem head {.5em}% Space after theorem headi {\thmname{#1}\thmnumber{\@ifnotempty{#1}{ }\@upn{#2}}% \thmnote{ {\the\thm@notefont(#3)}}}% Theorem head spec (can be left empty, meaning `normal') % \newtheoremstyle{thmstyletwo}% Numbered {18pt plus2pt minus1pt}% Space above {18pt plus2pt minus1pt}% Space below {\small\normalfont}% Body font {0pt}% Indent amount {\small\itshape}% Theorem head font {}% Punctuation after theorem head {.5em}% Space after theorem headi {\thmname{#1}\thmnumber{\@ifnotempty{#1}{ }{#2}}% \thmnote{ {\the\thm@notefont(#3)}}}% Theorem head spec (can be left empty, meaning `normal') % \newtheoremstyle{thmstylethree}% Definition {18pt plus2pt minus1pt}% Space above {18pt plus2pt minus1pt}% Space below {\small\normalfont}% Body font {0pt}% Indent amount {\small\bfseries}% Theorem head font {}% Punctuation after theorem head {.5em}% Space after theorem headi {\thmname{#1}\thmnumber{\@ifnotempty{#1}{ }\@upn{#2}}% \thmnote{ {\the\thm@notefont(#3)}}}% Theorem head spec (can be left empty, meaning `normal') % \newtheoremstyle{thmstylefour}% Proof {18pt plus2pt minus1pt}% Space above {18pt plus2pt minus1pt}% Space below {\small\normalfont}% Body font {0pt}% Indent amount {\small\itshape}% Theorem head font {}% Punctuation after theorem head {.5em}% Space after theorem headi {\global\proofthmtrue\thmname{#1} \thmnote{#3}}% Theorem head spec (can be left empty, meaning `normal') % }{} %% Macros for bibliographystyles %% % \def\bibcommenthead{\if@bibcomment\begingroup\parindent=0pt\parskip=0pt% % \removelastskip\vskip13pt\nointerlineskip% % % \vbox{\bibfont If you are submitting to one of the Nature Research journals, using the eJP % submission system, please include the references within the manuscript file itself. You may % do this by copying the reference list from your .bbl file, and pasting it into the bibliography % environment of the main manuscript .tex file.}\par% % \removelastskip\nobreak\vskip13pt\nobreak% % \endgroup\fi}% \def\bibcommenthead{}% \if@Spr@basic@refstyle% \if@Numbered@refstyle% \usepackage[numbers,sort&compress]{natbib}% \gdef\NumBib{YES}% \else% \usepackage[authoryear]{natbib}% \gdef\NumBib{NO}% \fi% \bibliographystyle{sn-basic}% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \if@Mathphys@refstyle% \if@Numbered@refstyle% \usepackage[numbers,sort&compress]{natbib}% \gdef\NumBib{YES}% \else% \usepackage[authoryear]{natbib}% \gdef\NumBib{NO}% \fi% \bibliographystyle{sn-mathphys}% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \if@APS@refstyle% \usepackage[numbers,sort&compress]{natbib}% \gdef\NumBib{YES}% \bibliographystyle{sn-APS}% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \if@Vancouver@refstyle% \if@Numbered@refstyle% \usepackage[numbers,sort&compress]{natbib}% \gdef\NumBib{YES}% \else% \usepackage[authoryear]{natbib}% \gdef\NumBib{NO}% \fi% \bibliographystyle{sn-vancouver}% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \if@APA@refstyle% \if@Numbered@refstyle% \usepackage[natbibapa]{apacite}% \gdef\NumBib{YES}% \else% \usepackage[natbibapa]{apacite}% \gdef\NumBib{NO}% \fi% \bibliographystyle{sn-apacite}% \def\refdoi#1{\urlstyle{rm}\url{#1}}% \renewcommand{\doiprefix}{}% \AtBeginDocument{% \renewcommand{\BPBI}{.}% Period between initials - command from apacite.sty }% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \if@Chicago@refstyle% \if@Numbered@refstyle% \usepackage[numbers,sort&compress]{natbib}% \gdef\NumBib{YES}% \else% \usepackage[authoryear]{natbib}% \gdef\NumBib{NO}% \fi% \bibliographystyle{sn-chicago}% \hypersetup{urlcolor=black,colorlinks=false,pdfborder={0 0 0}}\urlstyle{same}% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \if@Standard@Nature@refstyle% \usepackage[numbers,sort&compress]{natbib}% \gdef\NumBib{YES}% \bibliographystyle{sn-nature}% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \if@Default@refstyle% \usepackage[numbers,sort&compress]{natbib}% \gdef\NumBib{YES}% \setlength{\bibsep}{1em}% \def\bibfont{\reset@font\fontfamily{\rmdefault}\normalsize\selectfont}% \fi% \AtBeginDocument{\allowdisplaybreaks}% \def\eqnheadfont{\reset@font\fontfamily{\rmdefault}\fontsize{16}{18}\bfseries\selectfont}% \newcommand{\eqnhead}[1]{\begingroup% \begin{center} {\eqnheadfont #1}\par% \end{center} \removelastskip\vskip24pt% \thispagestyle{titlepage}%% %%\thispagestyle{empty}% \endgroup} %% Macros for border matrix %% \newif\if@borderstar \def\bordermatrix{\@ifnextchar*{% \@borderstartrue\@bordermatrix@i}{\@borderstarfalse\@bordermatrix@i*}% } \def\@bordermatrix@i*{\@ifnextchar[{\@bordermatrix@ii}{\@bordermatrix@ii[()]}} \def\@bordermatrix@ii[#1]#2{% \begingroup \m@th\@tempdima8.75\p@\setbox\z@\vbox{% \def\cr{\crcr\noalign{\kern 2\p@\global\let\cr\endline }}% \ialign {$##$\hfil\kern 2\p@\kern\@tempdima & \thinspace % \hfil $##$\hfil && \quad\hfil $##$\hfil\crcr\omit\strut % \hfil\crcr\noalign{\kern -\baselineskip}#2\crcr\omit % \strut\cr}}% \setbox\tw@\vbox{\unvcopy\z@\global\setbox\@ne\lastbox}% \setbox\tw@\hbox{\unhbox\@ne\unskip\global\setbox\@ne\lastbox}% \setbox\tw@\hbox{% $\kern\wd\@ne\kern -\@tempdima\left\@firstoftwo#1% \if@borderstar\kern2pt\else\kern -\wd\@ne\fi% \global\setbox\@ne\vbox{\box\@ne\if@borderstar\else\kern 2\p@\fi}% \vcenter{\if@borderstar\else\kern -\ht\@ne\fi% \unvbox\z@\kern-\if@borderstar2\fi\baselineskip}% \if@borderstar\kern-2\@tempdima\kern2\p@\else\,\fi\right\@secondoftwo#1 $% }\null \;\vbox{\kern\ht\@ne\box\tw@}% \endgroup } %% Macros for line numbers %% \if@vrulerlinenumberon% % \usepackage{vruler}% % %%\setvruler[][][][][][][][][] \def\linenoon{%%\definecolor{blue}{gray}{0}% \def\tiny{\normalsize\color{black}}% \setvruler[12bp][1][1][3][1][1.18\textwidth][26pt][-7pt][0.99\textheight]% for even pages: left side; for odd pages: right side; %%\linkbluecolor }% \linenoon% \def\lineno@off{\unsetvruler}% \fi% %% url macros %% \gdef\orcidlogo{% \includegraphics{Orcidlogo.eps}% }% \gdef\orcid#1{\href{#1}{\orcidlogo}}% \endinput \ No newline at end of file diff --git a/inst/rmarkdown/templates/springer/skeleton/sn-mathphys.bst b/inst/rmarkdown/templates/springer/skeleton/sn-mathphys.bst new file mode 100644 index 000000000..236a058ff --- /dev/null +++ b/inst/rmarkdown/templates/springer/skeleton/sn-mathphys.bst @@ -0,0 +1,3208 @@ +%% This is file `bmc-mathphys.bst' (created: 2011-12-27) +%% Compatible with bibtex version 0.99d. +%% +%% Please submit bugs or your comments to vtex@vtex.lt +%% Start subject with a "[BMC] bibtex: " + subject +%% +%% Sorting entries is done by name and year fields! +%% +%% You are free to use this style file as you see fit, provided +%% that you do not make changes to the file. +%% If you DO make changes, you are required to rename this file. +%% +%% It may be distributed under the terms of the LaTeX Project Public +%% License, as described in lppl.txt in the base LaTeX distribution. +%% Either version 1.0 or, at your option, any later version. +%% +%% LIMITATIONS: +%% If you are getting error like +%% "Sorry---you've exceeded BibTeX's number of string global-variables" +%% that means you are using to old bibtex version. You should download latest version 0.99d. +%% (One of the binaries location is minimals.contextgarden.net/current/bin/common/) +%% +%% BibTeX programming: Linas Stonys, VTeX, Lithuania, lstonys@vtex.lt +% +% Changes: +% 2013-07-15 -- added XML output (taken from bmc_article.bst) v2.0 +% + +ENTRY + { address + author + booktitle + bnumber + chapter + doi + edition + editor + howpublished + institution + isbn + journal + key + keywords + month + note + number + organization + pages + publisher + school + series + title + type + volume + year + url + info + options + urldate + eprint + archive + archivePrefix + primaryClass + eid + adsurl + adsnote + version + } + {} + { label extra.label sort.label short.list} + +INTEGERS { output.state before.all mid.sentence after.sentence + after.block after.authors between.elements bother + Nisbn Nmonth slen set.settings tmp month.printed} + +FUNCTION {init.state.consts} +{ #0 'before.all := + #1 'mid.sentence := + #2 'after.sentence := + #3 'after.block := + #4 'after.authors := + #5 'between.elements := +} + +STRINGS { s t element} +STRINGS { longest.label last.label list.string default.list} +STRINGS { v l f j b temp.str} + +FUNCTION {output.nonnull} +{ 's := + output.state mid.sentence = + { " " * write$ newline$} + { output.state after.block = + { add.period$ write$ + newline$ + } + { + output.state after.authors = + { ": " * write$ + newline$ + } + { output.state between.elements = + { ", " * write$ newline$} + { output.state before.all = + 'write$ + { add.period$ " " * write$ newline$} + if$ + } + if$ + } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +FUNCTION {output} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} + +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} +FUNCTION {fin.entry} +{ write$ newline$ } + +FUNCTION {stupid.colon} +{ after.authors 'output.state := } + + +FUNCTION {insert.comma} +{ output.state before.all = + 'skip$ + { between.elements 'output.state := } + if$ +} + +FUNCTION {new.sentence} +{ output.state after.block = + 'skip$ + { output.state before.all = + 'skip$ + { after.sentence 'output.state := } + if$ + } + if$ +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + + +FUNCTION {field.or.null} +{ duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ +} + +FUNCTION {sort.format.month} +{ 't := + t #1 #2 substring$ "01" = + t #1 #1 substring$ "1" = + t #2 #2 substring$ "" = + and or + { "January" } + { t #1 #2 substring$ "02" = + t #1 #1 substring$ "2" = + t #2 #2 substring$ "" = + and or + { "February" } + { t #1 #2 substring$ "03" = + t #1 #1 substring$ "3" = + t #2 #2 substring$ "" = + and or + { "March" } + { t #1 #2 substring$ "04" = + t #1 #1 substring$ "4" = + or + { "April" } + { t #1 #2 substring$ "05" = + t #1 #1 substring$ "5" = + or + { "May" } + { t #1 #2 substring$ "06" = + t #1 #1 substring$ "6" = + or + { "June" } + { t #1 #2 substring$ "07" = + t #1 #1 substring$ "7" = + or + { "July" } + { t #1 #2 substring$ "08" = + t #1 #1 substring$ "8" = + or + { "August" } + { t #1 #2 substring$ "09" = + t #1 #1 substring$ "9" = + or + { "September" } + { t #1 #2 substring$ "10" = + { "October" } + { t #1 #2 substring$ "11" = + { "November" } + { t #1 #2 substring$ "12" = + { "December" } + { t } % No match + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + +} + +INTEGERS {sk} +FUNCTION {is.num} +{ chr.to.int$ + duplicate$ "0" chr.to.int$ < not + swap$ "9" chr.to.int$ > not and +} + +FUNCTION {make.tag} +{ 't := + duplicate$ empty$ + { pop$ "" } + { bother #0 = + { + t "volume" = + {"\textbf{" swap$ * "}" * } + 'skip$ + if$ + } + { "\b" t * "{" * swap$ * "}" * } + if$ + } + if$ +} + + + +FUNCTION {springer.publisher} +{publisher #1 #8 substring$ "Springer" = + { "Springer" } + { publisher } + if$ +} + +FUNCTION {format.adsurl} +{ + adsurl empty$ + { "" } + {" \href{" adsurl "}" *} + if$ +} + +FUNCTION {format.adsnote} +{ + adsnote empty$ + { "" } + { ". " * adsnote *} + if$ +} + + +FUNCTION {format.soft.title} +{ + title empty$ + { "" } + { title "," *} + if$ +} + +FUNCTION {format.softmisctitle} +{ title empty$ + { ""} + { version empty$ + { title ", " *} + { title ", " * version " " *} + if$ + } + if$ +} + +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { "{[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {format.pub.address} +{ publisher empty$ + howpublished empty$ + and + { + address empty$ + 'skip$ + { volume empty$ + 'insert.comma + 'new.sentence + if$ + address + type$ "inproceedings" = + {"conflocation"} + {"location"} + if$ + make.tag output + } + if$ + } + { + address empty$ + { publisher empty$ + {howpublished} + {springer.publisher} + if$ + "publisher" make.tag + #1 bother = + {", \blocation{???}" * } + 'skip$ + if$ + output + } + { + publisher empty$ + {howpublished } + {springer.publisher } + if$ + "publisher" make.tag output + insert.comma + address "location" make.tag output + } + if$ + } + if$ +} + +INTEGERS { nameptr namesleft numnames } + +FUNCTION {mk.tag} +{ 'temp.str := + duplicate$ empty$ + { pop$ "" } + { + b "nothing" = + 'skip$ + { "\b" temp.str * "{" * swap$ * "}" * } + if$ + } + if$ +} + +FUNCTION {space.after.dot} +{'j := + t 'f := + j 't := + s 'j := + "" 'l := + "" 's := + { t empty$ not } + { + t #1 #3 substring$ "{-}" = + { l " {q}. " * 'l := + t #4 global.max$ substring$ 't := + } + 'skip$ + if$ + + t #1 #1 substring$ 's := + l s * 'l := + s "." = + { + t #2 #1 substring$ " " = + 'skip$ + { + l " " * 'l := + t #2 #4 substring$ "{\,}" = + { t #5 global.max$ substring$ 't := } + 'skip$ + if$ + } + if$ + } + 'skip$ + if$ + t #2 global.max$ substring$ 't := + } + while$ + f 't := + j 's := + l +} + +FUNCTION {fix.inits}{ + 't := + "" 'element := + { t empty$ not } + { + t #1 #3 substring$ ".q." = + { element ".-" * 'element := + t #3 global.max$ substring$ 't := + } + {element t #1 #1 substring$ * 'element :=} + if$ + + t #2 global.max$ substring$ 't := + } + while$ + element +} + +FUNCTION {fix.snm}{ + 't := + "" 'element := + { t empty$ not } + { + t #1 #3 substring$ "{-}" = + {element "-" * 'element := + t #3 global.max$ substring$ 't := + } + {element t #1 #1 substring$ * 'element :=} + if$ + + t #2 global.max$ substring$ 't := + } + while$ + element +} + +FUNCTION {enbrace.dash}{ + 't := + "" 'element := + { t empty$ not } + { + t #1 #1 substring$ "-" = + {element "{-}" * 'element :=} + {element t #1 #1 substring$ * 'element :=} + if$ + t #2 global.max$ substring$ 't := + } + while$ + element +} + +FUNCTION {fix.name}{ + + enbrace.dash 's := + "" 'l := + "" 't := + + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { + s nameptr "{vv~}{ll}{, jj}" format.name$ + s nameptr "{, ff}" format.name$ space.after.dot * 'l := + #1 nameptr = + {l 't :=} + {t " and " * l * 't := } + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + t +} + +FUNCTION {name.separator}{ + namesleft #1 > + {", " * } + 'skip$ + if$ +} + +FUNCTION {format.author.editor} +{ 'b := + + bother #1 = + b "nothing" = + or + 'skip$ + {"b" b * 'b :=} + if$ + + b "editor" = + b "beditor" = + b "nothing" = + or or + {editor 's :=} + {author 's :=} + if$ + + %% modifying name + s fix.name 's := + + "" 't := + + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + + s numnames "{ll}" format.name$ 'l := + l "others" = + l "{others}" = + l "et al." = + l "{et al.}" = + or or or + {#1 'tmp :=} + {#0 'tmp :=} + if$ + + { namesleft #0 > } + { s nameptr "{vv}" format.name$ "particle" mk.tag 'v := + s nameptr "{ll}" format.name$ fix.snm "snm" mk.tag 'l := + s nameptr "{f{.}.}" format.name$ fix.inits "inits" mk.tag 'f := + s nameptr "{jj}" format.name$ "suffix" mk.tag 'j := + + + namesleft #1 = + tmp #1 = + and + { b "bauthor" = + b "beditor" = + or + {"et al."} + {"\betal"} + if$ + #1 'tmp := + } + { + b "bauthor" = + b "beditor" = + or + {"\oauthor{"} + { + b "nothing" = + {""} + {"\b" b * "{" *} + if$ + } +%% if$ +%% +%% v empty$ +%% 'skip$ +%% {v * " " *} + if$ + + l empty$ + 'skip$ + { l *} + if$ + + f empty$ + 'skip$ + {", " * f *} + if$ + + j empty$ + 'skip$ + {" " * j *} + if$ + + b "nothing" = + {""} + {"}"} + if$ + + * "" 't := + } + if$ + + name.separator + write$ + + namesleft #1 > + b "nothing" = not + and + { namesleft #2 = + tmp #1 = + and + 'skip$ + 'newline$ + if$ + } + 'skip$ + if$ + + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ +} + +FUNCTION {format.editors} +{ editor empty$ + 'skip$ + { + bother #0 = + { author empty$ + {"editor"} + {"nothing"} + if$ + } + {"editor"} + if$ + format.author.editor + editor num.names$ #1 > + { " (eds.)" } + { " (ed.)" } + if$ + write$ + } + if$ +} + +FUNCTION {format.authors} +{ author empty$ + 'skip$ + {"author" format.author.editor} + if$ +} + +FUNCTION {cite.author.editor} +{ 's := + s #1 "{vv~}{ll}" format.name$ + s num.names$ duplicate$ + #2 > + { pop$ " et~al." * } + { #2 = + { s #2 "{vv~}{ll}{ jj}{ f}" format.name$ "others" = + { " et~al." * } + { " and " * s #2 "{vv~}{ll}" format.name$ * } + if$ + } + 'skip$ + if$ + } + if$ +} + +FUNCTION {check.auth.edit.org} +{author empty$ + { + editor empty$ + { + organization empty$ + {""} + {organization} + if$ + } + {editor cite.author.editor} + if$ + } + {author cite.author.editor} + if$ +} + +FUNCTION {check.year} +{ year empty$ + {""} + {year extra.label *} + if$ +} + +INTEGERS { multiresult char.num k int} +INTEGERS {str.length count return save.num1 save.num2} +FUNCTION {is.in.list}{ + 'f := + %%%% saveing "s" and "t" + s 'j := + f 's := + t 'f := + list.string text.length$ 'str.length := + list.string 't := +% s text.length$ 'slen := + int 'save.num1 := + count 'save.num2 := + #1 'int := + #1 'count := + #0 'return := + + { count str.length = not + #0 str.length = not + and + } + { + count #1 + 'count := + t int #1 substring$ "," = + { + t #1 int substring$ s "," * = + { + #1 'return := + str.length 'count := + } + 'skip$ + if$ + + int #1 + 'int := + t int global.max$ substring$ 't := + #0 'int := + } + 'skip$ + if$ + int #1 + 'int := + } + while$ + + save.num1 'int := + save.num2 'count := + + #0 return = + { s t = + {#1 'return :=} + 'skip$ + if$ + } + 'skip$ + if$ + %%%% returning original "s" and "t" + j 's := + f 't := + + return +} + +INTEGERS {bibitem.count} + +FUNCTION {print.count} +{ bibitem.count #1 + 'bibitem.count := + newline$ + "%%% " + bibitem.count int.to.str$ * write$ +} + + +FUNCTION {output.bibitem} +{ print.count + newline$ + "\bibitem[\protect\citeauthoryear{" write$ + check.auth.edit.org write$ + "}{" write$ + check.year write$ + "}]{" write$ + cite$ write$ + "}" write$ + newline$ + "" before.all 'output.state := +} + + + + +FUNCTION {string.to.integer} +{ 't := + t text.length$ 'k := + #1 'char.num := + { t char.num #1 substring$ 's := + s is.num + s "." = + or + char.num k = not + and + } + { char.num #1 + 'char.num := } + while$ + char.num #1 - 'char.num := + t #1 char.num substring$ +} + + +FUNCTION {find.integer} +{ 't := + #0 'int := + { int not + t empty$ not + and + } + { t #1 #1 substring$ 's := + s is.num + {#1 'int :=} + { t #2 global.max$ substring$ 't := } + if$ + } + while$ + int +} + +function{title.lowerwords}{ +"a,an,and,of,the,for,in,to,over,from,on,or,so,than,that,this,as,but,with,by,at,down,up,upon,al,ale,aus,aux,d'Analyse,d'Analystes,d'Architecture,d'Etudes,d'Histoire,da,dans,de,degli,dei,del," +"dell',dell'Accademia,dell'Istituto,dell'Universita,della,delle,dem,der,des,detta,di,die,din,dlia,do,du,e,eXpress,ed,ego,el,em,en,et,fur,i,iz,l'Academie,l'Age,l'Antiquite," * +"l'Approximation,l'Ecole,l'Histoire,l'I.S.U.P.,l'INSA,l'IREM,l'Indirizzo,l'Institut,l'Institute,l'UFR,l'Union,l'Universite,la,las,les,na,nella,per,po,si,sue,sur,ta,tes,und,van,voor,zu,zum,zur" * +} + +FUNCTION {upercase.first.letters}{ + 't := + "" 's := + #1 'int := + #1 'count := + list.string 'v := + "" 'b := + title.lowerwords 'list.string := + + t text.length$ 'slen := + + {count slen = not } + {t int #1 substring$ " " = + { + int #1 - 'int := + t #1 int substring$ 'b := + + % if word not in title.lowerwords - uppercase first letter + b is.in.list not + { b "l" change.case$ b = + { b "u" change.case$ "t" change.case$ 'b := } + 'skip$ + if$ + } + 'skip$ + if$ + + int #1 + 'int := + + s b " " * * 's := + int #1 + 'int := + t int global.max$ substring$ 't := + #0 'int := + } + 'skip$ + if$ + int #1 + 'int := + count #1 + 'count := +% "count=" count int.to.str$ * " slen=" * slen int.to.str$ * top$ + } + while$ + v 'list.string := + % last word is "t" and need to check it too + s t + t "l" change.case$ t = + { "u" change.case$ "t" change.case$ } + 'skip$ + if$ + * +} + + +FUNCTION {format.title} +{ title empty$ + { "" } + { title + "article" type$ = + type$ "techreport" = + type$ "inbook" = + type$ "inproceedings" = + type$ "incollection" = + type$ "phdthesis" = + type$ "mastersthesis" = + or or or or or or + {"t" change.case$} + { type$ "unpublished" = + type$ "misc" = + or + 'skip$ + 'upercase.first.letters + if$ + } + if$ + } + if$ +} + + +FUNCTION {note.presented} +{ note #1 #9 substring$ "presented" = + note #1 #9 substring$ "Presented" = + or +} + +FUNCTION {n.filter} +{ 't := + "" + { t empty$ not } + { t #1 #1 substring$ "," = + t #1 #1 substring$ "\" = + t #1 #1 substring$ "~" = + or or + { "" * + t #2 global.max$ substring$ 't := + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + +FUNCTION {byear} +{ duplicate$ empty$ + { pop$ "" } + { 't := + t text.length$ 'sk := + #5 sk = + { t #1 #4 substring$ 's := + t #5 #1 substring$ 'longest.label := + longest.label is.num not + {s "year" make.tag + "nameyear" is.in.list + {longest.label * } + 'skip$ + if$ + } + {t "year" make.tag } + if$ + } + { t "year" make.tag + "nameyear" is.in.list + {extra.label *} + 'skip$ + if$ + } + if$ + } + if$ +} + +FUNCTION {format.date} +{ year empty$ + { "" } + { year byear } + if$ +} + +FUNCTION {parens} +{ "(" swap$ * ")" * } + +FUNCTION {format.date.parens} +{ year empty$ + { "" } + { year byear parens } + if$ +} + +FUNCTION {noparens} +{ " " swap$ * "" * } + +FUNCTION {format.softmiscdate} +{ year empty$ + { "" } + { year byear parens } + if$ +} + +FUNCTION {format.month}{ + month empty$ + {""} + {month sort.format.month "confdate" make.tag} + if$ +} + +FUNCTION {formatpatent.date} +{ year empty$ + 'skip$ + { month empty$ + { year } + {format.month " " * year *} + if$ + } + if$ +} + +FUNCTION {month.year.date} +{ year empty$ + {""} + { month empty$ + {year byear} + { format.month " " * year byear * } + if$ + type$ "inproceedings" = + 'skip$ + {"(" swap$ * ")" * } + if$ + } + if$ +} + +FUNCTION {tie.or.space.connect} +{ duplicate$ text.length$ #3 < + { "~" } + { " " } + if$ + swap$ * * +} +FUNCTION {format.volume} +{ volume empty$ + { "book" type$ = + {number empty$ + {""} + {"vol. " number "seriesno" make.tag *} + if$ + } + {""} + if$ + } + {"vol. " volume "seriesno" make.tag *} + if$ +} +FUNCTION {format.volume2} +{ volume empty$ + {""} + {"vol. " volume "seriesno" make.tag *} + if$ +} + +FUNCTION {format.art.vol} +{ + volume empty$ + {""} + {volume n.filter "volume" make.tag} + if$ + number empty$ + 'skip$ + { "(" number "issue" make.tag * ")" * * } + if$ +} + +FUNCTION {format.series} +{ series empty$ + 'skip$ + {series "sertitle" make.tag} + if$ +} + +FUNCTION {format.edition} +{ edition empty$ + { "" } + { "" 'v := + "" 'l := + "" 'f := + edition "l" change.case$ 's := + "1" s = + "first" s = + or + { + "1" 'v := + "st" 'l := + } + { + "2" s = + "second" s = + or + { + "2" 'v := + "nd" 'l := + } + { + "3" s = + "third" s = + or + { + "3" 'v := + "rd" 'l := + } + { + "4" s = + "fourth" s = + or + { + "4" 'v := + "th" 'l := + } + { + "5" s = + "fifth" s = + or + { + "5" 'v := + "th" 'l := + } + { + "6" s = + "sixth" s = + or + { + "6" 'v := + "th" 'l := + } + { + "7" s = + "seventh" s = + or + { + "7" 'v := + "th" 'l := + } + { + "8" s = + "eighth" s = + or + { + "8" 'v := + "th" 'l := + } + { + "9" s = + "nineth" s = + or + { + "9" 'v := + "th" 'l := + } + { + edition "t" change.case$ 'f := + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + #0 bother = + { f "" = + { v l * 'f :=} + 'skip$ + if$ + } + { f "" = + { "\bedition{" v * "}" * l * 'f :=} + { "\bedition{" f * "}" * 'f :=} + if$ + } + if$ + f " edn." * + } + if$ +} +FUNCTION {format.isbn} +{ isbn empty$ + { "" } + { isbn "isbn" make.tag} + if$ +} + +INTEGERS {default.info} + + +FUNCTION {multi.page.check} +{ 't := + #0 'multiresult := + "" 'l := + + {t empty$ not} + { t #1 #1 substring$ 's := + + s is.num not + { "" l = not + {t find.integer + {#1 'multiresult := } + {#0 'multiresult := } + if$ + "" 't := + } + { + t #2 global.max$ substring$ 't := + } + if$ + } + { l s * 'l := + t #2 global.max$ substring$ 't := + } + if$ + } + while$ + multiresult +} +FUNCTION {clearpage} +{ 't := + "" 's := + "" 'l := + + { t empty$ not } + { + t #1 #1 substring$ 's := + s is.num not + 'skip$ + { l s * 'l := } + if$ + t #2 global.max$ substring$ 't := + } + while$ + l + +} +FUNCTION {do.pages} +{'t := + "" 'j := + "" 'v := + {t empty$ not} + { t #1 #1 substring$ 's := + s is.num not + s "," = not + and + { "" j = + { + t #2 global.max$ substring$ 't := + } + {t find.integer + { t clearpage 'v := } + 'skip$ + if$ + "" 't := + } + if$ + } + { j s * 'j := + t #2 global.max$ substring$ 't := + } + if$ + } + while$ + j clearpage 'j := + j "fpage" make.tag + "cnd" is.in.list + 'skip$ + {"--" * v "lpage" make.tag *} + if$ +} + + +FUNCTION {format.pages} +{ pages empty$ + { "" } + { pages multi.page.check + {type$ "article" = + {""} + {"cnd" is.in.list + {"p. "} + {"pp. "} + if$ + } + if$ + pages do.pages * + } + {type$ "article" = + {""} + {"p. "} + if$ + pages clearpage "fpage" make.tag * + } + + if$ + } + if$ +} + +FUNCTION {replace.tilde} +{ 't := + "" + { t empty$ not } + { t #1 #1 substring$ "~" = + { { t #1 #1 substring$ "~" = } + { "\texttildelow " * + t #2 global.max$ substring$ 't := + } + while$ + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + + +FUNCTION {format.url} +{ url empty$ + 'skip$ + { type$ "article" = + 'skip$ + { #0 bother = + { "\url{" } + { "\burl{" } + if$ + url replace.tilde * "}" * + output + } + if$ + + urldate empty$ + 'skip$ + { "Accessed " urldate * output } + if$ + } + if$ +} + + +FUNCTION {publisher.month.pages}{ + publisher empty$ series empty$ and + { address empty$ + 'skip$ + 'new.sentence + if$ + format.pub.address + + pages empty$ + 'skip$ + {insert.comma} + if$ + format.pages output + + } + { + pages empty$ + 'skip$ + {insert.comma} + if$ + format.pages output + publisher empty$ + 'skip$ + {new.sentence} + if$ + format.pub.address + } + if$ +} + +function{process.doi}{ + doi 't := + "" 'b := + #1 'int := +% "doi =" t * top$ + + t text.length$ 'slen := + + {int slen = not } + {t int #3 substring$ "10." = + { + t int #1 - #1 substring$ 'b := + b "" = + {"a" 'b :=} % if b is empty need to set a letter + 'skip$ + if$ + + b is.num not + { + t int slen int - #1 + substring$ 't := + slen #1 - 'int := + } + 'skip$ + if$ + + } + 'skip$ + if$ + int #1 + 'int := + } + while$ + t +} + +FUNCTION {format.doi} +{ doi empty$ + {""} + { + "nodoi" is.in.list + {""} + %%{"doi:\doiurl{" process.doi * "}" * } + {"\doiurl{" process.doi * "} " * } + if$ + } + if$ +} + +FUNCTION {format.in.ed.booktitle} +{ booktitle empty$ + {#1 bother = + "cnd" is.in.list not + and + { editor empty$ + 'skip$ + { "In: " output write$ format.editors } + if$ + } + 'skip$ + if$ + } + { editor empty$ + { "In: " booktitle upercase.first.letters "btitle" make.tag * output} + { "In: " output write$ format.editors "" %%% pushing empty string to the empty stack + booktitle upercase.first.letters "btitle" make.tag output + } + if$ + } + + if$ +} + +FUNCTION {format.in.ed} +{ title empty$ + 'skip$ + { editor empty$ + { title "btitle" make.tag output} + { author empty$ + { format.editors + stupid.colon + %format.date output + title "btitle" make.tag output + } + { "In: " output write$ format.editors "" %%% pushing empty string to the empty stack + title "btitle" make.tag output + } + if$ + } + if$ + } + if$ +} + +FUNCTION {format.tr.number} +{ type empty$ + { "Technical Report" } + 'type + if$ + number empty$ + { "t" change.case$ } + { number tie.or.space.connect } + if$ +} + +FUNCTION {patent.number} +{ number empty$ + 'skip$ + { number } + if$ +} +INTEGERS { len } + +FUNCTION {chop.word} +{ 's := + 'len := + s #1 len substring$ = + { s len #1 + global.max$ substring$ } + 's + if$ +} + +FUNCTION {format.inpres} +{ "l" change.case$ 't := + "in press: " #10 + "in press. " #10 + "in press " #9 t chop.word + chop.word + chop.word + #1 global.max$ substring$ +} + +FUNCTION {bcomment.note} +{ note empty$ + 'skip$ + {note format.inpres "comment" make.tag output} + if$ +} + +FUNCTION {empty.misc.check} +{ author empty$ title empty$ howpublished empty$ + month empty$ year empty$ note empty$ + and and and and and + { "all relevant fields are empty in " cite$ * warning$ } + 'skip$ + if$ +} + +FUNCTION {format.thesis.type} +{ type empty$ + 'skip$ + { pop$ + type "t" change.case$ + } + if$ +} + +FUNCTION {format.chapter.and.note} +{ note empty$ chapter empty$ organization empty$ and and + 'skip$ + { chapter empty$ + "notnumber" last.label = + or + {organization empty$ + { note "comment" make.tag output } + { note empty$ + { organization "comment" make.tag output } + { organization ". " * note * "comment" make.tag output } + if$ + } + if$ + } + { note empty$ + { "Chap. " chapter * "comment" make.tag output} + { type empty$ + { "Chap. " } + { type "t" change.case$ "Section" = + { "Sect. " } + { "Chap. " } + if$ + } + if$ + chapter * ". " * note * "comment" make.tag output + } + if$ + } + if$ + } + if$ +} + +FUNCTION {item.end} +{ chapter empty$ + type$ "unpublished" = not + type$ "misc" = not + and and + { new.sentence + format.doi output + } + 'skip$ + if$ + + type$ "unpublished" = + type$ "misc" = + or + { note empty$ + 'skip$ + {note.presented + 'skip$ + {new.sentence note output} + if$ + } + if$ + format.date.parens output + } + { new.sentence + type$ "proceedings" = + { author empty$ editor empty$ and + 'bcomment.note + 'format.chapter.and.note + if$ + } + 'format.chapter.and.note + if$ + } + if$ + list.string 'v := + default.list 'list.string := + + type$ ".isbn" * is.in.list + "cnd" is.in.list + or + { + new.sentence +% format.isbn output + } + 'skip$ + if$ + new.sentence + %% commented by SPi as we are using format.eprint %% + %% and also to avoide eprint being printed twice - Start %% + %%eprint empty$ + %% 'skip$ + %% {"\arxivurl{" eprint * "}" * output} + %%if$ + %% End %% + chapter empty$ + type$ "unpublished" = not + type$ "misc" = not + and and + 'skip$ + { new.sentence + format.doi output + } + if$ + new.sentence + format.url + v 'list.string := + fin.entry +} + +FUNCTION {article.item.end} +{ chapter empty$ + type$ "unpublished" = not + type$ "misc" = not + and and + { new.sentence +% format.doi output + } + 'skip$ + if$ + + type$ "unpublished" = + type$ "misc" = + or + { note empty$ + 'skip$ + {note.presented + 'skip$ + {new.sentence note output} + if$ + } + if$ + format.date.parens output + } + { new.sentence + type$ "proceedings" = + { author empty$ editor empty$ and + 'bcomment.note + 'format.chapter.and.note + if$ + } + 'format.chapter.and.note + if$ + } + if$ + list.string 'v := + default.list 'list.string := + + type$ ".isbn" * is.in.list + "cnd" is.in.list + or + { + new.sentence +% format.isbn output + } + 'skip$ + if$ + new.sentence + %% commented by SPi as we are using format.eprint %% + %% and also to avoide eprint being printed twice - Start %% + %%eprint empty$ + %% 'skip$ + %% {"\arxivurl{" eprint * "}" * output} + %%if$ + %% End %% + chapter empty$ + type$ "unpublished" = not + type$ "misc" = not + and and + 'skip$ + { new.sentence +%% format.doi output + } + if$ + new.sentence + format.url + v 'list.string := + fin.entry +} + + +FUNCTION {insert.element} +{ #0 bother = + { element "{botherref}" * write$ newline$} + { + type$ "article" = + {element "{barticle}" * write$ newline$} + 'skip$ + if$ + type$ "book" = + type$ "proceedings" = + type$ "manual" = + type$ "booklet" = + or or or + {element "{bbook}" * write$ newline$} + 'skip$ + if$ + + type$ "inbook" = + { "notnumber" last.label = + {element "{bchapter}" * write$ newline$} + {element "{bbook}" * write$ newline$} + if$ + } + 'skip$ + if$ + + type$ "incollection" = + type$ "inproceedings" = + type$ "conference" = + or or + {element "{bchapter}" * write$ newline$} + 'skip$ + if$ + } + if$ +} + +FUNCTION {end.element} +{ "\end" 'element := + item.end + insert.element + "\endbibitem" write$ newline$ +} + +FUNCTION {article.end.element} +{ "\end" 'element := + article.item.end + insert.element + "\endbibitem" write$ newline$ +} + + +FUNCTION {begin.element} +{ "\begin" 'element := + insert.element +} +function {set.options}{ + options empty$ + 'skip$ + {options 'list.string :=} + if$ +} + +FUNCTION {settings} +{} + +FUNCTION {article} +{ output.bibitem + author empty$ + institution empty$ + editor empty$ + and and + journal empty$ + or + year empty$ + or + % above tagging rule means: + % nead: (volume & (pages or number) ) or (doi [without volume, pages and number]) + volume empty$ not + pages empty$ not bnumber empty$ not or + and + + volume empty$ pages empty$ bnumber empty$ and and + doi empty$ not and + or + not + or + {#0 'bother :=} + {#1 'bother :=} + if$ + begin.element + author empty$ + { editor empty$ + 'skip$ + {format.editors stupid.colon} + if$ + } + { format.authors stupid.colon} + if$ + "cnd" is.in.list + { + journal empty$ + {format.title "atitle" make.tag "title" output.check} + {journal "jtitle" make.tag output} + if$ + } + { + format.title "atitle" make.tag "title" output.check + journal empty$ + 'skip$ + {new.sentence journal "jtitle" make.tag output} + if$ + } + if$ + format.art.vol output + pages empty$ + 'skip$ + {insert.comma} + if$ + format.pages output + format.date.parens output + format.doi output + format.eprint output + format.primaryClass output + article.end.element +} + + +FUNCTION {patent} +{ output.bibitem + #0 'bother := + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + format.title "title" output.check + add.period$ + patent.number output + insert.comma + formatpatent.date output + end.element +} + +FUNCTION { other } { patent } + +FUNCTION {book} +{ output.bibitem + author empty$ + institution empty$ + organization empty$ + editor empty$ + and and and + title empty$ + year empty$ + or or + {#0 'bother :=} + { + publisher empty$ address empty$ not and + {#0 'bother :=} + {#1 'bother :=} + if$ + } + if$ + begin.element + author empty$ + { editor empty$ + 'skip$ + {format.editors stupid.colon} + if$ + } + { format.authors stupid.colon} + if$ + format.title "btitle" make.tag "title" output.check + series empty$ + { + format.volume output + insert.comma + format.edition output + } + { edition empty$ + 'skip$ + 'insert.comma + if$ + format.edition output + new.sentence + format.series output + insert.comma + format.volume output + } + if$ + publisher.month.pages + format.date.parens output + end.element +} + +FUNCTION {booklet} +{output.bibitem + author empty$ + title empty$ + year empty$ + howpublished empty$ + or or or + {#0 'bother :=} + {#1 'bother :=} + if$ + + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + format.title "btitle" make.tag "title" output.check + address empty$ publisher empty$ howpublished empty$ and and + 'skip$ + 'new.sentence + if$ + format.pub.address + format.date.parens output + end.element +} + +FUNCTION {misc} +{output.bibitem + #0 'bother := + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + format.title "btitle" make.tag "title" output.check + address empty$ publisher empty$ howpublished empty$ and and + 'skip$ + 'new.sentence + if$ + format.pub.address + end.element +} + +FUNCTION {softmisc} +{output.bibitem + #0 'bother := + begin.element + author empty$ + 'skip$ + {format.authors} + if$ + stupid.colon + format.title "btitle" make.tag "title" output.check + insert.comma + version output + insert.comma + %%address empty$ publisher empty$ howpublished empty$ and and + %%'skip$ + %% 'new.sentence + %%if$ + format.pub.address + format.softmiscdate output + insert.comma + format.softmisc.eprint output + end.element +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + institution empty$ + organization empty$ + editor empty$ + and and and + title empty$ + year empty$ + or or + {#0 'bother :=} + { + publisher empty$ address empty$ not and + {#0 'bother :=} + {#1 'bother :=} + if$ + } + if$ + + chapter empty$ + { "" 'last.label :=} + { chapter string.to.integer empty$ author empty$ not and + { "notnumber" 'last.label :=} + { "" 'last.label :=} + if$ + } + if$ + + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + "notnumber" last.label = + { chapter "ctitle" make.tag output + add.period$ + } + 'skip$ + if$ + format.in.ed + series empty$ + { + insert.comma + format.volume output + insert.comma + format.edition output + new.sentence + } + { + insert.comma + format.edition output + new.sentence + format.series output + volume empty$ + 'skip$ + 'insert.comma + if$ + format.volume output + } + if$ + publisher.month.pages + publisher empty$ address empty$ edition empty$ series empty$ pages empty$ volume empty$ and and and and and + 'insert.comma + 'skip$ + if$ + format.date.parens output + end.element +} +FUNCTION {incollection} +{ output.bibitem + author empty$ + institution empty$ + and + booktitle empty$ + title empty$ + year empty$ + or or or + {#0 'bother :=} + { + publisher empty$ address empty$ not and + {#0 'bother :=} + {#1 'bother :=} + if$ + } + if$ + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + + "cnd" is.in.list + { + booktitle empty$ title empty$ not and + { + format.title "ctitle" make.tag "title" output.check + new.sentence + } + 'skip$ + if$ + } + { + format.title "ctitle" make.tag "title" output.check + title empty$ + 'skip$ + {new.sentence} + if$ + } + if$ + format.in.ed.booktitle + series empty$ + { + format.volume output + insert.comma + format.edition output + } + { + edition empty$ + 'skip$ + { insert.comma + format.edition output + } + if$ + new.sentence + format.series output + insert.comma + format.volume output + } + if$ + publisher.month.pages + format.date.parens output + end.element +} + +FUNCTION {inproceedings} +{ output.bibitem + author empty$ + institution empty$ + and + title empty$ + year empty$ + or or + {#0 'bother :=} + {#1 'bother :=} + if$ + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + + "cnd" is.in.list + { + booktitle empty$ title empty$ not and + { + format.title "ctitle" make.tag "title" output.check + new.sentence + } + 'skip$ + if$ + } + { + format.title "ctitle" make.tag "title" output.check + title empty$ booktitle empty$ not and + 'skip$ + {new.sentence} + if$ + } + if$ + + format.in.ed.booktitle + series empty$ + 'skip$ + {new.sentence format.series output} + if$ + volume empty$ address empty$ publisher empty$ and and + 'skip$ + 'insert.comma + if$ + format.volume output + publisher.month.pages + format.date.parens output + end.element +} + +FUNCTION {conference} { inproceedings } + +FUNCTION {manual} +{ output.bibitem + author empty$ + organization empty$ + title empty$ + year empty$ + address empty$ + or or or or + {#0 'bother :=} + {#1 'bother :=} + if$ + begin.element + + author empty$ + { organization empty$ + 'skip$ + { organization "publisher" make.tag output.nonnull + stupid.colon% add.period$ + } + if$ + } + { format.authors stupid.colon} + if$ + title empty$ + 'skip$ + {format.title "btitle" make.tag output} + if$ + edition empty$ + {new.sentence} + {insert.comma} + if$ + format.edition output + edition empty$ + 'skip$ + {new.sentence} + if$ + author empty$ organization empty$ + or + 'skip$ + { organization "publisher" make.tag output.nonnull + insert.comma + } + if$ + address empty$ + 'skip$ + {address "location" make.tag output} + if$ + format.date.parens output + end.element +} + + +FUNCTION {phdthesis} +{output.bibitem + #0 'bother := + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + format.title "title" output.check + new.sentence + type$ "mastersthesis" = + {"Master's thesis" format.thesis.type output.nonnull} + {"PhD thesis" format.thesis.type output.nonnull} + if$ + school empty$ + 'skip$ + 'insert.comma + if$ + school "school" output.check + address empty$ + 'skip$ + 'insert.comma + if$ + address output + month.year.date output + end.element +} +FUNCTION {mastersthesis}{phdthesis} + + +FUNCTION {proceedings} +{ output.bibitem + author empty$ + institution empty$ + organization empty$ + editor empty$ + and and and + title empty$ + year empty$ + or or + {#0 'bother :=} + { + publisher empty$ address empty$ not and + {#0 'bother :=} + {#1 'bother :=} + if$ + } + if$ + + begin.element + author empty$ + { editor empty$ + {organization "institutionaled" make.tag "organization" output.check } + { format.editors } + if$ + } + { format.authors } + if$ + stupid.colon + format.title "btitle" make.tag output + series empty$ + 'skip$ + {new.sentence format.series output} + if$ + volume empty$ + 'skip$ + 'insert.comma + if$ + format.volume output + publisher.month.pages + format.date.parens output + end.element +} + +FUNCTION {techreport} +{ output.bibitem + #0 'bother := + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + format.title "title" output.check + new.sentence + format.tr.number output.nonnull + institution empty$ + 'skip$ + 'insert.comma + if$ + institution "institution" output.check + address empty$ + 'skip$ + 'insert.comma + if$ + address output + month.year.date output + end.element +} + +FUNCTION {unpublished} +{ output.bibitem + #0 'bother := + + begin.element + author empty$ + 'skip$ + {format.authors stupid.colon} + if$ + format.title "title" output.check + note empty$ + 'skip$ + { note.presented + {note output} + 'skip$ + if$ + } + if$ + end.element +} + +FUNCTION {default.type} { unpublished } + +MACRO {jan} {"January"} +MACRO {feb} {"February"} +MACRO {mar} {"March"} +MACRO {apr} {"April"} +MACRO {may} {"May"} +MACRO {jun} {"June"} +MACRO {jul} {"July"} +MACRO {aug} {"August"} +MACRO {sep} {"September"} +MACRO {oct} {"October"} +MACRO {nov} {"November"} +MACRO {dec} {"December"} + +READ + +FUNCTION {sortify} +{ purify$ + "l" change.case$ +} + +INTEGERS { et.al.char.used } + +FUNCTION {initialize.et.al.char.used} +{ #0 'et.al.char.used := +} + +%%%%% setting default options +FUNCTION {set.default.opt} +{"unsort" 'list.string :=} + +EXECUTE {set.default.opt} + +FUNCTION {assign.opt}{ + % First need to set options + "settings" type$ = + { options empty$ + 'skip$ + {options 'list.string :=} + if$ + } + 'skip$ + if$ +} + +ITERATE {assign.opt} +EXECUTE {initialize.et.al.char.used} + +FUNCTION {alpha.format.lab.names} +{ 's := + s num.names$ 'numnames := + numnames #1 > + { numnames #4 > + { #3 'namesleft := } + { numnames 'namesleft := } + if$ + #1 'nameptr := + "" + { namesleft #0 > } + { nameptr numnames = + { s nameptr "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { "+" * + #1 'et.al.char.used := + } + { s nameptr "{v{}}{l{}}" format.name$ * } + if$ + } + { s nameptr "{v{}}{l{}}" format.name$ * } + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + numnames #4 > + { "+" * + #1 'et.al.char.used := + } + 'skip$ + if$ + } + { s #1 "{v{}}{l{}}" format.name$ + duplicate$ text.length$ #2 < + { pop$ s #1 "{ll}" format.name$ #3 text.prefix$ } + 'skip$ + if$ + } + if$ +} + +FUNCTION {standard.format.lab.names} +{ 's := + s #1 "{vv~}{ll}" format.name$ + s num.names$ duplicate$ + #2 > + { pop$ " et~al." * } + { #2 < + 'skip$ + { s #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { " et~al." * } + { " and " * s #2 "{vv~}{ll}" format.name$ * } + if$ + } + if$ + } + if$ +} +FUNCTION {format.lab.names}{ + "alpha" is.in.list + 'alpha.format.lab.names + 'standard.format.lab.names + if$ +} + +FUNCTION {author.key.label} +{ author empty$ + { key empty$ + { cite$ #1 #3 substring$ } + { key #3 text.prefix$ } + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {author.editor.key.label} +{ author empty$ + { editor empty$ + { key empty$ + { "zzz" } + { key #3 text.prefix$ } + if$ + } + { editor format.lab.names } + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {author.key.organization.label} +{ author empty$ + { key empty$ + { organization empty$ + { "zzz" } + { "The " #4 organization chop.word #3 text.prefix$ } + if$ + } + { key #3 text.prefix$ } + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {editor.key.organization.label} +{ editor empty$ + { key empty$ + { organization empty$ + { "zzz" } + { "The " #4 organization chop.word #3 text.prefix$ } + if$ + } + { key #3 text.prefix$ } + if$ + } + { editor format.lab.names } + if$ +} + +FUNCTION {calc.short.authors} +{ type$ "book" = + type$ "inbook" = + or + 'author.editor.key.label + { type$ "proceedings" = + 'editor.key.organization.label + { type$ "manual" = + 'author.key.organization.label + 'author.key.label + if$ + } + if$ + } + if$ + 'short.list := +} + +FUNCTION {calc.label} +{ calc.short.authors + short.list + + "alpha" is.in.list + { + duplicate$ + year field.or.null purify$ #-1 #2 substring$ + * + 'label := + year field.or.null purify$ #-1 #4 substring$ + * + sortify 'sort.label := + } + { + "(" + * + year duplicate$ empty$ + short.list key field.or.null = or + { pop$ "" } + 'skip$ + if$ + * + 'label := + label 'sort.label := + } + if$ +} + +FUNCTION {sort.format.names} +{ 's := + #1 'nameptr := + "" + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { nameptr #1 > + { " " * + "alpha" is.in.list + 'skip$ + {numnames int.to.str$ * " " *} + if$ + } + 'skip$ + if$ + s nameptr "{vv{ } }{ll{ }}{ ff{ }}{ jj{ }}" format.name$ 't := + nameptr numnames = + t "others" = + and + { "et al" * } + { t sortify * } + if$ + #3 numnames < + "alpha" is.in.list not + and + {#0 'namesleft := + " zzz " * + } + { + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + if$ + } + while$ +} + +FUNCTION {sort.format.title} +{ 't := + "A " #2 + "An " #3 + "The " #4 t chop.word + chop.word + chop.word + sortify + #1 global.max$ substring$ +} + +FUNCTION {author.sort} +{ author empty$ + { key empty$ + { "to sort, need author or key in " cite$ * warning$ + "zzz" + } + { key sortify } + if$ + } + { author sort.format.names } + if$ +} + +FUNCTION {author.editor.sort} +{ author empty$ + { editor empty$ + { key empty$ + { "to sort, need author, editor, or key in " cite$ * warning$ + "z" + } + { key sortify } + if$ + } + { editor sort.format.names } + if$ + } + { author sort.format.names } + if$ +} + +FUNCTION {author.organization.sort} +{ author empty$ + { organization empty$ + { key empty$ + { "to sort, need author, organization, or key in " cite$ * warning$ + "z" + } + { key sortify } + if$ + } + { "The " #4 organization chop.word sortify } + if$ + } + { author sort.format.names } + if$ +} + +FUNCTION {editor.organization.sort} +{ editor empty$ + { organization empty$ + { key empty$ + { "to sort, need editor, organization, or key in " cite$ * warning$ + "z" + } + { key sortify } + if$ + } + { "The " #4 organization chop.word sortify } + if$ + } + { editor sort.format.names } + if$ +} + +FUNCTION {presort} +{ calc.label + sort.label sortify + " " + * + type$ "book" = + type$ "inbook" = + or + {author empty$ + 'editor.organization.sort + 'author.organization.sort + if$ + } + { type$ "proceedings" = + type$ "incollection" = + or + {author empty$ + 'editor.organization.sort + 'author.organization.sort + if$ + } + { type$ "manual" = + 'author.organization.sort + 'author.sort + if$ + } + if$ + } + if$ + " " + * + year field.or.null sortify + * + " " + * + title field.or.null + sort.format.title + * + #1 entry.max$ substring$ 'sort.label := + sort.label * + #1 entry.max$ substring$ 'sort.key$ := + + "settings" type$ = + {"aaa"} + {"unsort" is.in.list + {"bb"} + {"alpha" is.in.list + {sort.key$} + {sort.label} + if$ + } + if$ + } + if$ + 'sort.key$ := +} + + +ITERATE {presort} + +SORT + +INTEGERS { longest.label.width last.extra.num number.label } + +FUNCTION {initialize.longest.label} +{ "" 'longest.label := + #0 int.to.chr$ 'last.label := + "" 'j := + #0 'longest.label.width := + #0 'last.extra.num := + #0 'number.label := +} + +FUNCTION {forward.pass} +{ last.label label = + { last.extra.num #1 + 'last.extra.num := + last.extra.num int.to.chr$ 'extra.label := + } + { "a" chr.to.int$ 'last.extra.num := + "" 'extra.label := + label 'last.label := + } + if$ + number.label #1 + 'number.label := +} + +FUNCTION {reverse.pass} +{ j "b" = + { "a" 'extra.label := } + 'skip$ + if$ + extra.label 'j := + label extra.label * 'label := +} + +EXECUTE {initialize.longest.label} + +ITERATE {forward.pass} + +REVERSE {reverse.pass} + +FUNCTION {write.preambule} +{ "%% BioMed_Central_Bib_Style_v1.01" write$ newline$ newline$ + "\begin{thebibliography}{" number.label int.to.str$ * "}" * write$ newline$ + "% BibTex style file: bmc-mathphys.bst (version 2.1), 2014-07-24" write$ newline$ + "\ifx \bisbn \undefined \def \bisbn #1{ISBN #1}\fi" write$ newline$ + "\ifx \binits \undefined \def \binits#1{#1}\fi" write$ newline$ + "\ifx \bauthor \undefined \def \bauthor#1{#1}\fi" write$ newline$ + "\ifx \batitle \undefined \def \batitle#1{#1}\fi" write$ newline$ + "\ifx \bjtitle \undefined \def \bjtitle#1{#1}\fi" write$ newline$ + "\ifx \bvolume \undefined \def \bvolume#1{\textbf{#1}}\fi" write$ newline$ + "\ifx \byear \undefined \def \byear#1{#1}\fi" write$ newline$ + "\ifx \bissue \undefined \def \bissue#1{#1}\fi" write$ newline$ + "\ifx \bfpage \undefined \def \bfpage#1{#1}\fi" write$ newline$ + "\ifx \blpage \undefined \def \blpage #1{#1}\fi" write$ newline$ + "\ifx \burl \undefined \def \burl#1{\textsf{#1}}\fi" write$ newline$ + %%"\ifx \doiurl \undefined \def \doiurl#1{\textsf{#1}}\fi" write$ newline$ + "\ifx \doiurl \undefined \def \doiurl#1{\url{https://doi.org/#1}}\fi" write$ newline$ + "\ifx \betal \undefined \def \betal{\textit{et al.}}\fi" write$ newline$ + "\ifx \binstitute \undefined \def \binstitute#1{#1}\fi" write$ newline$ + "\ifx \binstitutionaled \undefined \def \binstitutionaled#1{#1}\fi" write$ newline$ + "\ifx \bctitle \undefined \def \bctitle#1{#1}\fi" write$ newline$ + "\ifx \beditor \undefined \def \beditor#1{#1}\fi" write$ newline$ + "\ifx \bpublisher \undefined \def \bpublisher#1{#1}\fi" write$ newline$ + "\ifx \bbtitle \undefined \def \bbtitle#1{#1}\fi" write$ newline$ + "\ifx \bedition \undefined \def \bedition#1{#1}\fi" write$ newline$ + "\ifx \bseriesno \undefined \def \bseriesno#1{#1}\fi" write$ newline$ + "\ifx \blocation \undefined \def \blocation#1{#1}\fi" write$ newline$ + "\ifx \bsertitle \undefined \def \bsertitle#1{#1}\fi" write$ newline$ + "\ifx \bsnm \undefined \def \bsnm#1{#1}\fi" write$ newline$ + "\ifx \bsuffix \undefined \def \bsuffix#1{#1}\fi" write$ newline$ + "\ifx \bparticle \undefined \def \bparticle#1{#1}\fi" write$ newline$ + "\ifx \barticle \undefined \def \barticle#1{#1}\fi" write$ newline$ + "\bibcommenthead" write$ newline$ +} + + +FUNCTION {begin.bib} +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + write.preambule + "\ifx \bconfdate \undefined \def \bconfdate #1{#1}\fi" write$ newline$ + "\ifx \botherref \undefined \def \botherref #1{#1}\fi" write$ newline$ + "\ifx \url \undefined \def \url#1{\textsf{#1}}\fi" write$ newline$ + "\ifx \bchapter \undefined \def \bchapter#1{#1}\fi" write$ newline$ + "\ifx \bbook \undefined \def \bbook#1{#1}\fi" write$ newline$ + "\ifx \bcomment \undefined \def \bcomment#1{#1}\fi" write$ newline$ + "\ifx \oauthor \undefined \def \oauthor#1{#1}\fi" write$ newline$ + "\ifx \citeauthoryear \undefined \def \citeauthoryear#1{#1}\fi" write$ newline$ + "\ifx \endbibitem \undefined \def \endbibitem {}\fi" write$ newline$ + "\ifx \bconflocation \undefined \def \bconflocation#1{#1}\fi" write$ newline$ + "\ifx \arxivurl \undefined \def \arxivurl#1{\textsf{#1}}\fi" write$ newline$ + "\csname PreBibitemsHook\endcsname" write$ newline$ +} + +EXECUTE {begin.bib} + +EXECUTE {init.state.consts} + +ITERATE {call.type$} + +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} + +EXECUTE {end.bib} + + +%% XML output - done for each entry referenced in the BibTeX database +INTEGERS {i ll li j.int global.counter} +STRINGS {lr lp lt ls } + +FUNCTION {replace} +{ + 'lr := % replace string + 'lp := % pattern + 'lt := % text to search + "" 'ls := % result string + lp text.length$ 'll := % length of the search pattern + { lt empty$ not } + { lt #1 ll substring$ lp = + { ls lr * 'ls := + lt ll #1 + global.max$ substring$ 'lt := } + { ls lt #1 #1 substring$ * 'ls := + lt #2 global.max$ substring$ 'lt := } + if$ + } + while$ + ls +} + +FUNCTION {strip.letters} +{ + "" 's := + duplicate$ missing$ + 'pop$ + { + 't := + { t "" = not } + { % ascii '0' = 48, '9' = 57 + t #1 #1 substring$ chr.to.int$ 'i := + i #47 > i #58 < and + { s t #1 #1 substring$ * 's := } + 'skip$ + if$ + t #2 global.max$ substring$ 't := + } + while$ + } + if$ + s +} +FUNCTION {output.xml} +{ duplicate$ "" = + 'pop$ + { " " swap$ * write$ newline$ } + if$ +} + +%% + % markup.xml + % + % Takes 2 args text & tag {"the text " "tag"} + % Returns 1 string {"the text <\tag>"} +%% +FUNCTION {markup.xml} +{ + "" 'v := % result + 't := % tag + duplicate$ missing$ + 'pop$ + { 'v := } + if$ + v "" = + 'skip$ + { "<" t * ">" * v * "" * 'v := } + if$ + v +} + +%% Takes 2 args - tag, string +FUNCTION{markup.xml.title} +{ pop$ % tag + duplicate$ missing$ + 'pop$ + { + 's := % string + s "\&" "&" replace 's := + s "p" markup.xml 's := + s "title" markup.xml output.xml + } + if$ +} + + +%% + % markup.xml.pages + % + % Takes 1 arg (pages string) + % seperates into and if + % there is a - seperator. else no lpage. + % + % need to remove others +%% +FUNCTION{markup.xml.pages} +{ + "" 'v := % fpage + "" 's := % lpage + duplicate$ missing$ + 'pop$ + { + 't := + t " " "" replace 't := % remove all spaces. pgs must be - seperated + { t empty$ not } + { + t #1 #1 substring$ "-" = + { + t #2 global.max$ substring$ 's := + "" 't := % break while loop + }{ + v t #1 #1 substring$ * 'v := + t #2 global.max$ substring$ 't := + } + if$ + } + while$ + } + if$ + v "fpage" markup.xml output.xml + s "lpage" markup.xml output.xml +} + + +%% + % markup.xml.names + % + % Takes 2 args + % tag, namefield (eg. author "au") + % splits fields into and + % writes info + % returns nothing +%% +FUNCTION {markup.xml.names} +{ + 't := % tag + "" 'v := + "" 's := + duplicate$ empty$ + { pop$ + organization missing$ + { institution "cnm" markup.xml + "au" markup.xml "aug" markup.xml output.xml } + { organization "cnm" markup.xml + "au" markup.xml "aug" markup.xml output.xml } + if$ } + { + " " write$ newline$ + 'temp.str := % names string + temp.str num.names$ 'j.int := % num of names + #1 'i := % init counter + { i #1 j.int + < } % while (i <= j.int) + { + " " write$ + + % Initial first names + % if first name all in capitals + % - assume is initial list of first names. + temp.str i "{ff{ }}" format.name$ + duplicate$ "u" change.case$ = + { temp.str i "{ff{ }}" format.name$ } + { temp.str i "{f{}}" format.name$ } + if$ + + % if last name but no first name use cnm; else snm + duplicate$ "" = + { temp.str i "{ll{ }}" format.name$ % last names space seperated. + "cnm" markup.xml write$ } + { temp.str i "{ll{ }}" format.name$ % last names space seperated. + "snm" markup.xml write$ } + if$ + + "fnm" markup.xml write$ + + "" write$ newline$ + i #1 + 'i := + } + while$ + " " write$ newline$ + } + if$ +} + + +%% + % markup.xml.pub + % + % Takes 4 args (school address publisher tag) + % prints concatenation + % returns nothing +%% +FUNCTION {markup.xml.pub} +{ + 't := % Tag + "" 'v := % Publisher + "" 'l := % Address + "" 'f := % School + "" 's := % Answer + duplicate$ missing$ 'pop$ { 'v := } if$ + duplicate$ missing$ 'pop$ { 'l := } if$ + duplicate$ missing$ 'pop$ { 'f := } if$ + "" f = not % school not empty + { f 's := } % return school as publisher + { % else + "" v = "" l = and % address and pub empty + 'skip$ + { + "" l = + { v 's := } % return pub + { "" v = + { l 's := } % return add + { l ": " * v * 's := } % return add : pub + if$ + } + if$ + } + if$ + } + if$ + s t markup.xml output.xml +} + +%% + % xml.phd + % + % Takes nothing + % Returns type (phd/msc) of empty string +%% +FUNCTION {xml.phd} +{ + "phdthesis" type$ = + "mastersthesis" type$ = or + { "phdthesis" type$ = + { "PhD thesis" } + { "Master's thesis" } + if$ + } + { type } % usually empty + if$ +} + +% markup.xml.edition +% +% edition is a numeric value. ie "2" +% if format 2nd 1st etc.. strip letters. +% +FUNCTION {markup.xml.edition} +{ pop$ pop$ %clear stack + edition strip.letters duplicate$ "" = + { pop$ edition } + 'skip$ + if$ + "edition" markup.xml output.xml +} + + +FUNCTION{begin.bmcxmlcomment}{ + newline$ + "\newcommand{\BMCxmlcomment}[1]{}" write$ newline$ + newline$ + "\BMCxmlcomment{" write$ newline$ + newline$ "" write$ newline$ +} + +FUNCTION{end.bmcxmlcomment}{ + newline$ + "" write$ newline$ + "} % end of \BMCxmlcomment" write$ newline$ +} + +FUNCTION {export.xml}{ + newline$ + global.counter #1 + 'global.counter := + "" * + write$ newline$ +% title "\&" "&" replace "title" markup.xml.title + title "title" markup.xml.title + author "aug" markup.xml.names % org. and inst. here + howpublished missing$ + { booktitle missing$ + { journal missing$ + { xml.phd } % Phd/Msc + {journal} + if$ + } {booktitle} + if$ + } { howpublished } + if$ "source" markup.xml output.xml + school + address + publisher "publisher" markup.xml.pub + editor "editor" markup.xml output.xml + edition "edition" markup.xml.edition + series "p" markup.xml + "title" markup.xml + "series" markup.xml output.xml + chapter "p" markup.xml + "title" markup.xml + "section" markup.xml output.xml + % month % ignore + year "pubdate" markup.xml output.xml + + note missing$ + { volume "volume" markup.xml output.xml + number "issue" markup.xml output.xml + pages markup.xml.pages + url "url" markup.xml output.xml } + { note "l" change.case$ "in press" = + { " " write$ newline$ } + { volume "volume" markup.xml output.xml + number "issue" markup.xml output.xml + pages markup.xml.pages + url "url" markup.xml output.xml + note "note" markup.xml output.xml + } + if$ + } + if$ + "" write$ newline$ +} + +%%EXECUTE {begin.bmcxmlcomment} +%%ITERATE {export.xml} +%%EXECUTE {end.bmcxmlcomment} + + + + diff --git a/inst/rmarkdown/templates/springer/skeleton/sn-nature.bst b/inst/rmarkdown/templates/springer/skeleton/sn-nature.bst new file mode 100644 index 000000000..cae8f64c2 --- /dev/null +++ b/inst/rmarkdown/templates/springer/skeleton/sn-nature.bst @@ -0,0 +1,1710 @@ +%% +%% This is file `naturemag.bst', +%% generated with the docstrip utility. +%% +%% The original source files were: +%% +%% merlin.mbs (with options: `head,seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% physjour.mbs (with options: `seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% geojour.mbs (with options: `seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% photjour.mbs (with options: `seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% merlin.mbs (with options: `tail,seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% ---------------------------------------- +%% *** Style for the journal Nature (created by Peter Czoschke) *** +%% +%% Copyright 1994-2002 Patrick W Daly + % =============================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files, listed above. + % + % This generated file can be redistributed and/or modified under the terms + % of the LaTeX Project Public License Distributed from CTAN + % archives in directory macros/latex/base/lppl.txt; either + % version 1 of the License, or any later version. + % =============================================================== + % Name and version information of the main mbs file: + % \ProvidesFile{merlin.mbs}[2002/10/21 4.05 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + %------------------------------------------------------------------- + % This bibliography style file is intended for texts in ENGLISH + % This is a numerical citation style, and as such is standard LaTeX. + % It requires no extra package to interface to the main text. + % The form of the \bibitem entries is + % \bibitem{key}... + % Usage of \cite is as follows: + % \cite{key} ==>> [#] + % \cite[chap. 2]{key} ==>> [#, chap. 2] + % where # is a number determined by the ordering in the reference list. + % The order in the reference list is that by which the works were originally + % cited in the text, or that in the database. + %--------------------------------------------------------------------- + +ENTRY + { address + archive + author + booktitle + chapter + edition + editor + eprint + howpublished + institution + journal + key + keywords + month + note + number + organization + pages + publisher + school + series + title + type + url + doi + volume + year + archivePrefix + primaryClass + eid + adsurl + adsnote + version + } + {} + { label } +INTEGERS { output.state before.all mid.sentence after.sentence after.block } +FUNCTION {init.state.consts} +{ #0 'before.all := + #1 'mid.sentence := + #2 'after.sentence := + #3 'after.block := +} +STRINGS { s t} +FUNCTION {output.nonnull} +{ 's := + output.state mid.sentence = + { ", " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +FUNCTION {output.in.nonnull} +{ 's := + output.state mid.sentence = + { ", " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} +FUNCTION {output} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} + +FUNCTION {in.output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.in.nonnull + if$ +} +FUNCTION {fin.entry} +{ add.period$ + write$ + newline$ +} + +FUNCTION {new.block} +{ output.state before.all = + 'skip$ + { after.block 'output.state := } + if$ +} +FUNCTION {new.sentence} +{ output.state after.block = + 'skip$ + { output.state before.all = + 'skip$ + { after.sentence 'output.state := } + if$ + } + if$ +} +FUNCTION {add.blank} +{ " " * before.all 'output.state := +} + +FUNCTION {date.block} +{ + new.block +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} +FUNCTION {new.block.checka} +{ empty$ + 'skip$ + 'new.block + if$ +} +FUNCTION {new.block.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.block + if$ +} +FUNCTION {new.sentence.checka} +{ empty$ + 'skip$ + 'new.sentence + if$ +} +FUNCTION {new.sentence.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.sentence + if$ +} +FUNCTION {field.or.null} +{ duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ +} +FUNCTION {emphasize} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" swap$ * "}" * } + if$ +} +FUNCTION {bolden} +{ duplicate$ empty$ + { pop$ "" } + { "\textbf{" swap$ * "}" * } + if$ +} +FUNCTION {tie.or.space.prefix} +{ duplicate$ text.length$ #3 < + { "~" } + { " " } + if$ + swap$ +} + +FUNCTION {capitalize} +{ "u" change.case$ "t" change.case$ } + +FUNCTION {space.word} +{ " " swap$ * " " * } + % Here are the language-specific definitions for explicit words. + % Each function has a name bbl.xxx where xxx is the English word. + % The language selected here is ENGLISH +FUNCTION {bbl.and} +{ "and"} + +FUNCTION {bbl.etal} +{ "et~al." } + +FUNCTION {bbl.in.editors} +{ "eds " } + +FUNCTION {bbl.editors} +{ "eds" } + +FUNCTION {bbl.editor} +{ "ed." } + +FUNCTION {bbl.edby} +{ "edited by" } + +FUNCTION {bbl.edition} +{ "edn" } + +FUNCTION {bbl.volume} +{ "Vol." } + +FUNCTION {bbl.of} +{ "of" } + +FUNCTION {bbl.number} +{ "no." } + +FUNCTION {bbl.nr} +{ "no." } + +FUNCTION {bbl.in} +{ "in" } + +FUNCTION {bbl.pages} +{ "" } + +FUNCTION {bbl.page} +{ "" } + +FUNCTION {bbl.chapter} +{ "Ch." } + +FUNCTION {bbl.techrep} +{ "Tech. Rep." } + +FUNCTION {bbl.mthesis} +{ "Master's thesis" } + +FUNCTION {bbl.phdthesis} +{ "Ph.D. thesis" } + +MACRO {jan} {"Jan."} + +MACRO {feb} {"Feb."} + +MACRO {mar} {"Mar."} + +MACRO {apr} {"Apr."} + +MACRO {may} {"May"} + +MACRO {jun} {"Jun."} + +MACRO {jul} {"Jul."} + +MACRO {aug} {"Aug."} + +MACRO {sep} {"Sep."} + +MACRO {oct} {"Oct."} + +MACRO {nov} {"Nov."} + +MACRO {dec} {"Dec."} + + %------------------------------------------------------------------- + % Begin module: + % \ProvidesFile{physjour.mbs}[2002/01/14 2.2 (PWD)] +MACRO {aa}{"Astron. \& Astrophys."} +MACRO {aasup}{"Astron. \& Astrophys. Suppl. Ser."} +MACRO {aj} {"Astron. J."} +MACRO {aph} {"Acta Phys."} +MACRO {advp} {"Adv. Phys."} +MACRO {ajp} {"Amer. J. Phys."} +MACRO {ajm} {"Amer. J. Math."} +MACRO {amsci} {"Amer. Sci."} +MACRO {anofd} {"Ann. Fluid Dyn."} +MACRO {am} {"Ann. Math."} +MACRO {ap} {"Ann. Phys. (NY)"} +MACRO {adp} {"Ann. Phys. (Leipzig)"} +MACRO {ao} {"Appl. Opt."} +MACRO {apl} {"Appl. Phys. Lett."} +MACRO {app} {"Astroparticle Phys."} +MACRO {apj} {"Astrophys. J."} +MACRO {apjsup} {"Astrophys. J. Suppl."} +MACRO {apss} {"Astrophys. Space Sci."} +MACRO {araa} {"Ann. Rev. Astron. Astrophys."} +MACRO {baas} {"Bull. Amer. Astron. Soc."} +MACRO {baps} {"Bull. Amer. Phys. Soc."} +MACRO {cmp} {"Comm. Math. Phys."} +MACRO {cpam} {"Commun. Pure Appl. Math."} +MACRO {cppcf} {"Comm. Plasma Phys. \& Controlled Fusion"} +MACRO {cpc} {"Comp. Phys. Comm."} +MACRO {cqg} {"Class. Quant. Grav."} +MACRO {cra} {"C. R. Acad. Sci. A"} +MACRO {fed} {"Fusion Eng. \& Design"} +MACRO {ft} {"Fusion Tech."} +MACRO {grg} {"Gen. Relativ. Gravit."} +MACRO {ieeens} {"IEEE Trans. Nucl. Sci."} +MACRO {ieeeps} {"IEEE Trans. Plasma Sci."} +MACRO {ijimw} {"Interntl. J. Infrared \& Millimeter Waves"} +MACRO {ip} {"Infrared Phys."} +MACRO {irp} {"Infrared Phys."} +MACRO {jap} {"J. Appl. Phys."} +MACRO {jasa} {"J. Acoust. Soc. America"} +MACRO {jcp} {"J. Comp. Phys."} +MACRO {jetp} {"Sov. Phys.--JETP"} +MACRO {jfe} {"J. Fusion Energy"} +MACRO {jfm} {"J. Fluid Mech."} +MACRO {jmp} {"J. Math. Phys."} +MACRO {jne} {"J. Nucl. Energy"} +MACRO {jnec} {"J. Nucl. Energy, C: Plasma Phys., Accelerators, Thermonucl. Res."} +MACRO {jnm} {"J. Nucl. Mat."} +MACRO {jpc} {"J. Phys. Chem."} +MACRO {jpp} {"J. Plasma Phys."} +MACRO {jpsj} {"J. Phys. Soc. Japan"} +MACRO {jsi} {"J. Sci. Instrum."} +MACRO {jvst} {"J. Vac. Sci. \& Tech."} +MACRO {nat} {"Nature"} +MACRO {nature} {"Nature"} +MACRO {nedf} {"Nucl. Eng. \& Design/Fusion"} +MACRO {nf} {"Nucl. Fusion"} +MACRO {nim} {"Nucl. Inst. \& Meth."} +MACRO {nimpr} {"Nucl. Inst. \& Meth. in Phys. Res."} +MACRO {np} {"Nucl. Phys."} +MACRO {npb} {"Nucl. Phys. B"} +MACRO {nt/f} {"Nucl. Tech./Fusion"} +MACRO {npbpc} {"Nucl. Phys. B (Proc. Suppl.)"} +MACRO {inc} {"Nuovo Cimento"} +MACRO {nc} {"Nuovo Cimento"} +MACRO {pf} {"Phys. Fluids"} +MACRO {pfa} {"Phys. Fluids A: Fluid Dyn."} +MACRO {pfb} {"Phys. Fluids B: Plasma Phys."} +MACRO {pl} {"Phys. Lett."} +MACRO {pla} {"Phys. Lett. A"} +MACRO {plb} {"Phys. Lett. B"} +MACRO {prep} {"Phys. Rep."} +MACRO {pnas} {"Proc. Nat. Acad. Sci. USA"} +MACRO {pp} {"Phys. Plasmas"} +MACRO {ppcf} {"Plasma Phys. \& Controlled Fusion"} +MACRO {phitrsl} {"Philos. Trans. Roy. Soc. London"} +MACRO {prl} {"Phys. Rev. Lett."} +MACRO {pr} {"Phys. Rev."} +MACRO {physrev} {"Phys. Rev."} +MACRO {pra} {"Phys. Rev. A"} +MACRO {prb} {"Phys. Rev. B"} +MACRO {prc} {"Phys. Rev. C"} +MACRO {prd} {"Phys. Rev. D"} +MACRO {pre} {"Phys. Rev. E"} +MACRO {ps} {"Phys. Scripta"} +MACRO {procrsl} {"Proc. Roy. Soc. London"} +MACRO {rmp} {"Rev. Mod. Phys."} +MACRO {rsi} {"Rev. Sci. Inst."} +MACRO {science} {"Science"} +MACRO {sciam} {"Sci. Am."} +MACRO {sam} {"Stud. Appl. Math."} +MACRO {sjpp} {"Sov. J. Plasma Phys."} +MACRO {spd} {"Sov. Phys.--Doklady"} +MACRO {sptp} {"Sov. Phys.--Tech. Phys."} +MACRO {spu} {"Sov. Phys.--Uspeki"} +MACRO {st} {"Sky and Telesc."} + % End module: physjour.mbs + %------------------------------------------------------------------- + % Begin module: + % \ProvidesFile{geojour.mbs}[2002/07/10 2.0h (PWD)] +MACRO {aisr} {"Adv. Space Res."} +MACRO {ag} {"Ann. Geophys."} +MACRO {anigeo} {"Ann. Geofis."} +MACRO {angl} {"Ann. Glaciol."} +MACRO {andmet} {"Ann. d. Meteor."} +MACRO {andgeo} {"Ann. d. Geophys."} +MACRO {andphy} {"Ann. Phys.-Paris"} +MACRO {afmgb} {"Arch. Meteor. Geophys. Bioklimatol."} +MACRO {atph} {"Atm\'osphera"} +MACRO {aao} {"Atmos. Ocean"} +MACRO {ass}{"Astrophys. Space Sci."} +MACRO {atenv} {"Atmos. Environ."} +MACRO {aujag} {"Aust. J. Agr. Res."} +MACRO {aumet} {"Aust. Meteorol. Mag."} +MACRO {blmet} {"Bound.-Lay. Meteorol."} +MACRO {bams} {"Bull. Amer. Meteorol. Soc."} +MACRO {cch} {"Clim. Change"} +MACRO {cdyn} {"Clim. Dynam."} +MACRO {cbul} {"Climatol. Bull."} +MACRO {cap} {"Contrib. Atmos. Phys."} +MACRO {dsr} {"Deep-Sea Res."} +MACRO {dhz} {"Dtsch. Hydrogr. Z."} +MACRO {dao} {"Dynam. Atmos. Oceans"} +MACRO {eco} {"Ecology"} +MACRO {empl}{"Earth, Moon and Planets"} +MACRO {envres} {"Environ. Res."} +MACRO {envst} {"Environ. Sci. Technol."} +MACRO {ecms} {"Estuarine Coastal Mar. Sci."} +MACRO {expa}{"Exper. Astron."} +MACRO {geoint} {"Geofis. Int."} +MACRO {geopub} {"Geofys. Publ."} +MACRO {geogeo} {"Geol. Geofiz."} +MACRO {gafd} {"Geophys. Astrophys. Fluid Dyn."} +MACRO {gfd} {"Geophys. Fluid Dyn."} +MACRO {geomag} {"Geophys. Mag."} +MACRO {georl} {"Geophys. Res. Lett."} +MACRO {grl} {"Geophys. Res. Lett."} +MACRO {ga} {"Geophysica"} +MACRO {gs} {"Geophysics"} +MACRO {ieeetap} {"IEEE Trans. Antenn. Propag."} +MACRO {ijawp} {"Int. J. Air Water Pollut."} +MACRO {ijc} {"Int. J. Climatol."} +MACRO {ijrs} {"Int. J. Remote Sens."} +MACRO {jam} {"J. Appl. Meteorol."} +MACRO {jaot} {"J. Atmos. Ocean. Technol."} +MACRO {jatp} {"J. Atmos. Terr. Phys."} +MACRO {jastp} {"J. Atmos. Solar-Terr. Phys."} +MACRO {jce} {"J. Climate"} +MACRO {jcam} {"J. Climate Appl. Meteor."} +MACRO {jcm} {"J. Climate Meteor."} +MACRO {jcy} {"J. Climatol."} +MACRO {jgr} {"J. Geophys. Res."} +MACRO {jga} {"J. Glaciol."} +MACRO {jh} {"J. Hydrol."} +MACRO {jmr} {"J. Mar. Res."} +MACRO {jmrj} {"J. Meteor. Res. Japan"} +MACRO {jm} {"J. Meteor."} +MACRO {jpo} {"J. Phys. Oceanogr."} +MACRO {jra} {"J. Rech. Atmos."} +MACRO {jaes} {"J. Aeronaut. Sci."} +MACRO {japca} {"J. Air Pollut. Control Assoc."} +MACRO {jas} {"J. Atmos. Sci."} +MACRO {jmts} {"J. Mar. Technol. Soc."} +MACRO {jmsj} {"J. Meteorol. Soc. Japan"} +MACRO {josj} {"J. Oceanogr. Soc. Japan"} +MACRO {jwm} {"J. Wea. Mod."} +MACRO {lao} {"Limnol. Oceanogr."} +MACRO {mwl} {"Mar. Wea. Log"} +MACRO {mau} {"Mausam"} +MACRO {meteor} {"``Meteor'' Forschungsergeb."} +MACRO {map} {"Meteorol. Atmos. Phys."} +MACRO {metmag} {"Meteor. Mag."} +MACRO {metmon} {"Meteor. Monogr."} +MACRO {metrun} {"Meteor. Rundsch."} +MACRO {metzeit} {"Meteor. Z."} +MACRO {metgid} {"Meteor. Gidrol."} +MACRO {mwr} {"Mon. Weather Rev."} +MACRO {nwd} {"Natl. Weather Dig."} +MACRO {nzjmfr} {"New Zeal. J. Mar. Freshwater Res."} +MACRO {npg} {"Nonlin. Proc. Geophys."} +MACRO {om} {"Oceanogr. Meteorol."} +MACRO {ocac} {"Oceanol. Acta"} +MACRO {oceanus} {"Oceanus"} +MACRO {paleoc} {"Paleoceanography"} +MACRO {pce} {"Phys. Chem. Earth"} +MACRO {pmg} {"Pap. Meteor. Geophys."} +MACRO {ppom} {"Pap. Phys. Oceanogr. Meteor."} +MACRO {physzeit} {"Phys. Z."} +MACRO {pps} {"Planet. Space Sci."} +MACRO {pss} {"Planet. Space Sci."} +MACRO {pag} {"Pure Appl. Geophys."} +MACRO {qjrms} {"Quart. J. Roy. Meteorol. Soc."} +MACRO {quatres} {"Quat. Res."} +MACRO {rsci} {"Radio Sci."} +MACRO {rse} {"Remote Sens. Environ."} +MACRO {rgeo} {"Rev. Geophys."} +MACRO {rgsp} {"Rev. Geophys. Space Phys."} +MACRO {rdgeo} {"Rev. Geofis."} +MACRO {revmeta} {"Rev. Meteorol."} +MACRO {sgp}{"Surveys in Geophys."} +MACRO {sp} {"Solar Phys."} +MACRO {ssr} {"Space Sci. Rev."} +MACRO {tellus} {"Tellus"} +MACRO {tac} {"Theor. Appl. Climatol."} +MACRO {tagu} {"Trans. Am. Geophys. Union (EOS)"} +MACRO {wrr} {"Water Resour. Res."} +MACRO {weather} {"Weather"} +MACRO {wafc} {"Weather Forecast."} +MACRO {ww} {"Weatherwise"} +MACRO {wmob} {"WMO Bull."} +MACRO {zeitmet} {"Z. Meteorol."} + % End module: geojour.mbs + %------------------------------------------------------------------- + % Begin module: + % \ProvidesFile{photjour.mbs}[1999/02/24 2.0b (PWD)] + +MACRO {appopt} {"Appl. Opt."} +MACRO {bell} {"Bell Syst. Tech. J."} +MACRO {ell} {"Electron. Lett."} +MACRO {jasp} {"J. Appl. Spectr."} +MACRO {jqe} {"IEEE J. Quantum Electron."} +MACRO {jlwt} {"J. Lightwave Technol."} +MACRO {jmo} {"J. Mod. Opt."} +MACRO {josa} {"J. Opt. Soc. America"} +MACRO {josaa} {"J. Opt. Soc. Amer.~A"} +MACRO {josab} {"J. Opt. Soc. Amer.~B"} +MACRO {jdp} {"J. Phys. (Paris)"} +MACRO {oc} {"Opt. Commun."} +MACRO {ol} {"Opt. Lett."} +MACRO {phtl} {"IEEE Photon. Technol. Lett."} +MACRO {pspie} {"Proc. Soc. Photo-Opt. Instrum. Eng."} +MACRO {sse} {"Solid-State Electron."} +MACRO {sjot} {"Sov. J. Opt. Technol."} +MACRO {sjqe} {"Sov. J. Quantum Electron."} +MACRO {sleb} {"Sov. Phys.--Leb. Inst. Rep."} +MACRO {stph} {"Sov. Phys.--Techn. Phys."} +MACRO {stphl} {"Sov. Techn. Phys. Lett."} +MACRO {vr} {"Vision Res."} +MACRO {zph} {"Z. f. Physik"} +MACRO {zphb} {"Z. f. Physik~B"} +MACRO {zphd} {"Z. f. Physik~D"} + +MACRO {CLEO} {"CLEO"} +MACRO {ASSL} {"Adv. Sol.-State Lasers"} +MACRO {OSA} {"OSA"} + % End module: photjour.mbs +%% Copyright 1994-2002 Patrick W Daly +MACRO {acmcs} {"ACM Comput. Surv."} + +MACRO {acta} {"Acta Inf."} + +MACRO {cacm} {"Commun. ACM"} + +MACRO {ibmjrd} {"IBM J. Res. Dev."} + +MACRO {ibmsj} {"IBM Syst.~J."} + +MACRO {ieeese} {"IEEE Trans. Software Eng."} + +MACRO {ieeetc} {"IEEE Trans. Comput."} + +MACRO {ieeetcad} + {"IEEE Trans. Comput. Aid. Des."} + +MACRO {ipl} {"Inf. Process. Lett."} + +MACRO {jacm} {"J.~ACM"} + +MACRO {jcss} {"J.~Comput. Syst. Sci."} + +MACRO {scp} {"Sci. Comput. Program."} + +MACRO {sicomp} {"SIAM J. Comput."} + +MACRO {tocs} {"ACM Trans. Comput. Syst."} + +MACRO {tods} {"ACM Trans. Database Syst."} + +MACRO {tog} {"ACM Trans. Graphic."} + +MACRO {toms} {"ACM Trans. Math. Software"} + +MACRO {toois} {"ACM Trans. Office Inf. Syst."} + +MACRO {toplas} {"ACM Trans. Progr. Lang. Syst."} + +MACRO {tcs} {"Theor. Comput. Sci."} + +FUNCTION {bibinfo.check} +{ swap$ + duplicate$ missing$ + { + pop$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ pop$ + } + { swap$ + "\bibinfo{" swap$ * "}{" * swap$ * "}" * + } + if$ + } + if$ +} +FUNCTION {bibinfo.warn} +{ swap$ + duplicate$ missing$ + { + swap$ "missing " swap$ * " in " * cite$ * warning$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ "empty " swap$ * " in " * cite$ * warning$ + } + { swap$ + "\bibinfo{" swap$ * "}{" * swap$ * "}" * + } + if$ + } + if$ +} +FUNCTION {format.eprint} +{ eprint duplicate$ empty$ + 'skip$ + { "\eprint" + archive empty$ + 'skip$ + { "[" * archive * "]" * } + if$ + "{" * swap$ * "}" * + } + if$ +} +FUNCTION {format.url} +{ url empty$ + { "" } + { "\urlprefix\url{" url * "}" * } + if$ +} + +FUNCTION {format.doi} +{ doi empty$ + { "" } + { "\doi{" doi * "}" * } + if$ +} + +STRINGS { bibinfo} +INTEGERS { nameptr namesleft numnames } + +FUNCTION {format.names} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{vv~}{ll}{, f.}{, jj}" + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + nameptr #1 + #1 + = + numnames #5 + > and + { "others" 't := + #1 'namesleft := } + 'skip$ + if$ + namesleft #1 > + { ", " * t * } + { + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal emphasize * + } + { + "\&" + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} +FUNCTION {format.names.ed} +{ + format.names +} +FUNCTION {format.authors} +{ author "author" format.names +} +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {get.in.bbl.editor} +{ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + " " * + get.bbl.editor + "(" swap$ * ")" * + * + } + if$ +} + +FUNCTION {format.in.editors} +{ "" editor "editor" format.names duplicate$ empty$ 'skip$ + { swap$ "(eds" * + " " * swap$ * + swap$ " " * + swap$ * ")" * + } + if$ +} + +FUNCTION {format.note} +{ + note empty$ + { "" } + { note #1 #1 substring$ + duplicate$ "{" = + 'skip$ + { output.state mid.sentence = + { "l" } + { "u" } + if$ + change.case$ + } + if$ + note #2 global.max$ substring$ * "note" bibinfo.check + } + if$ +} + + + +FUNCTION {format.in.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + " in \textit{" swap$ * "}" * "title" bibinfo.check +} + +FUNCTION {format.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "title" bibinfo.check +} + +FUNCTION {format.inpro.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "title" bibinfo.check + emphasize} + +FUNCTION {format.version} +{ version + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "version" bibinfo.check +} + +%FUNCTION {format.inpro.title} +%{ title +% duplicate$ empty$ 'skip$ +% { "t" change.case$ } +% if$ +% "title" bibinfo.check +% emphasize} + +FUNCTION {output.bibitem} +{ newline$ + "\bibitem{" write$ + cite$ write$ + "}" write$ + newline$ + "" + before.all 'output.state := +} + +FUNCTION {n.dashify} +{ + 't := + "" + { t empty$ not } + { t #1 #1 substring$ "-" = + { t #1 #2 substring$ "--" = not + { "--" * + t #2 global.max$ substring$ 't := + } + { { t #1 #1 substring$ "-" = } + { "-" * + t #2 global.max$ substring$ 't := + } + while$ + } + if$ + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + +FUNCTION {word.in} +{ bbl.in capitalize + " " * } + +FUNCTION {format.date} +{ + "" + duplicate$ empty$ + year "year" bibinfo.check duplicate$ empty$ + { swap$ 'skip$ + { "there's a month but no year in " cite$ * warning$ } + if$ + * + } + { swap$ 'skip$ + { + swap$ + " " * swap$ + } + if$ + * + } + if$ + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + " (" swap$ * ")" * + } + if$ +} +FUNCTION {format.btitle} +{ title "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + emphasize + } + if$ +} +FUNCTION {either.or.check} +{ empty$ + 'pop$ + { "can't use both " swap$ * " fields in " * cite$ * warning$ } + if$ +} +FUNCTION {format.bvolume} +{ volume empty$ + { "" } + { bbl.volume volume tie.or.space.prefix + "volume" bibinfo.check * * + series "series" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ bbl.of space.word * swap$ + emphasize * } + if$ + "volume and number" number either.or.check + } + if$ +} +FUNCTION {format.number.series} +{ volume empty$ + { number empty$ + { series field.or.null } + { series empty$ + { number "number" bibinfo.check } + { output.state mid.sentence = + { bbl.number } + { bbl.number capitalize } + if$ + number tie.or.space.prefix "number" bibinfo.check * * + bbl.in space.word * + series "series" bibinfo.check * + } + if$ + } + if$ + } + { "" } + if$ +} + +FUNCTION {format.edition} +{ edition duplicate$ empty$ 'skip$ + { + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + " " * bbl.edition * + } + if$ +} +INTEGERS { multiresult } +FUNCTION {multi.page.check} +{ 't := + #0 'multiresult := + { multiresult not + t empty$ not + and + } + { t #1 #1 substring$ + duplicate$ "-" = + swap$ duplicate$ "," = + swap$ "+" = + or or + { #1 'multiresult := } + { t #2 global.max$ substring$ 't := } + if$ + } + while$ + multiresult +} +FUNCTION {format.pages} +{ pages duplicate$ empty$ 'skip$ + { duplicate$ multi.page.check + { + n.dashify + } + { + } + if$ + "pages" bibinfo.check + } + if$ +} +FUNCTION {format.journal.pages} +{ pages duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ + { pop$ pop$ format.pages } + { + ", " * + swap$ + n.dashify + "pages" bibinfo.check + * + } + if$ + } + if$ +} +FUNCTION {format.number} + {number empty$ + 'skip$ + { "~(" number * ")" * * } + if$ + } +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + bolden +% format.number + format.journal.pages +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + 'format.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + pages empty$ + 'skip$ + { ", " * format.pages * } + if$ + } + if$ +} + +FUNCTION {format.booktitle} +{ + booktitle "booktitle" bibinfo.check + emphasize +} +FUNCTION {format.in.ed.booktitle} +{ duplicate$ empty$ 'skip$ + { +editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { +format.booktitle swap$ +"(" editor num.names$ #1 > 'bbl.in.editors 'bbl.editor if$ * swap$ ") " * + * swap$ + * } + if$ + } + if$ +} +FUNCTION {empty.misc.check} +{ author empty$ title empty$ howpublished empty$ + month empty$ year empty$ note empty$ + and and and and and + { "all relevant fields are empty in " cite$ * warning$ } + 'skip$ + if$ +} +FUNCTION {format.thesis.type} +{ type duplicate$ empty$ + 'pop$ + { swap$ pop$ + "t" change.case$ "type" bibinfo.check + } + if$ +} +FUNCTION {format.tr.number} +{ number "number" bibinfo.check + type duplicate$ empty$ + { pop$ bbl.techrep } + 'skip$ + if$ + "type" bibinfo.check + swap$ duplicate$ empty$ + { pop$ "t" change.case$ } + { tie.or.space.prefix * * } + if$ +} +FUNCTION {format.article.crossref} +{ + key duplicate$ empty$ + { pop$ + journal duplicate$ empty$ + { "need key or journal for " cite$ * " to crossref " * crossref * warning$ } + { "journal" bibinfo.check emphasize word.in swap$ * } + if$ + } + { word.in swap$ * " " *} + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.crossref.editor} +{ editor #1 "{vv~}{ll}" format.name$ + "editor" bibinfo.check + editor num.names$ duplicate$ + #2 > + { pop$ + "editor" bibinfo.check + " " * bbl.etal + emphasize + * + } + { #2 < + 'skip$ + { editor #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + "editor" bibinfo.check + " " * bbl.etal + emphasize + * + } + { + " \& " + * editor #2 "{vv~}{ll}" format.name$ + "editor" bibinfo.check + * + } + if$ + } + if$ + } + if$ +} +FUNCTION {format.book.crossref} +{ volume duplicate$ empty$ + { "empty volume in " cite$ * "'s crossref of " * crossref * warning$ + pop$ word.in + } + { bbl.volume + capitalize + swap$ tie.or.space.prefix "volume" bibinfo.check * * bbl.of space.word * + } + if$ + editor empty$ + editor field.or.null author field.or.null = + or + { key empty$ + { series empty$ + { "need editor, key, or series for " cite$ * " to crossref " * + crossref * warning$ + "" * + } + { series emphasize * } + if$ + } + { key * } + if$ + } + { format.crossref.editor * } + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.incoll.inproc.crossref} +{ + editor empty$ + editor field.or.null author field.or.null = + or + { key empty$ + { format.booktitle duplicate$ empty$ + { "need editor, key, or booktitle for " cite$ * " to crossref " * + crossref * warning$ + } + { word.in swap$ * } + if$ + } + { word.in key * " " *} + if$ + } + { word.in format.crossref.editor * " " *} + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.org.or.pub} +{ 't := + "" + year empty$ + { "empty year in " cite$ * warning$ } + 'skip$ + if$ + address empty$ t empty$ and + year empty$ and + 'skip$ + { + add.blank "(" * + t empty$ + { address "address" bibinfo.check * + } + { t * + address empty$ + 'skip$ + { ", " * address "address" bibinfo.check * } + if$ + } + if$ + year empty$ + 'skip$ + { t empty$ address empty$ and + 'skip$ + { ", " * } + if$ + year "year" bibinfo.check + * + } + if$ + ")" * + } + if$ +} +FUNCTION {format.publisher.address} +{ publisher "publisher" bibinfo.warn format.org.or.pub +} + +FUNCTION {format.organization.address} +{ organization "organization" bibinfo.check format.org.or.pub +} + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { " {[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.soft.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ + "eprint" bibinfo.check +} + +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + new.block + format.title "title" output.check + new.block + crossref missing$ + { + journal + "journal" bibinfo.check + emphasize + "journal" output.check + add.blank + format.vol.num.pages output + format.date "year" output.check + } + { format.article.crossref output.nonnull + format.pages output + } + if$ + new.block + format.url output + new.block + %% format.doi output + format.note output + %%format.eprint output + %% format.soft.eprint output + %% add.blank + %% format.primaryClass output + fin.entry +} + +FUNCTION {book} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + add.blank + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + new.block + format.btitle "title" output.check + add.blank + format.edition output + crossref missing$ + { format.bvolume output + new.block + format.number.series output + new.sentence + format.publisher.address output + } + { + new.block + format.book.crossref output.nonnull + format.date "year" output.check + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} +FUNCTION {booklet} +{ output.bibitem + format.authors output + new.block + format.title "title" output.check + new.block + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + format.date output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + new.block + format.btitle "title" output.check + crossref missing$ + { + format.bvolume output + format.chapter.pages "chapter and pages" output.check + new.block + format.number.series output + new.sentence + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + new.block + format.book.crossref output.nonnull + format.date "year" output.check + } + if$ + format.edition output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + new.block + format.in.title "title" output.check + add.blank + format.edition output +% new.block + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.bvolume output + add.blank + format.number.series output + format.chapter.pages output + new.sentence + format.publisher.address output + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + new.block + format.editors output +add.blank + format.inpro.title "title" output.check + new.block + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.bvolume output + format.number.series output + format.pages output + new.sentence + publisher empty$ + { format.organization.address output } + { organization "organization" bibinfo.check output + format.publisher.address output + } + if$ + } + { format.incoll.inproc.crossref output.nonnull + format.pages output + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} +FUNCTION {conference} { inproceedings } +FUNCTION {manual} +{ output.bibitem + author empty$ + { organization "organization" bibinfo.check + duplicate$ empty$ 'pop$ + { output + address "address" bibinfo.check output + } + if$ + } + { format.authors output.nonnull } + if$ + new.block + format.btitle "title" output.check + author empty$ + { organization empty$ + { + address new.block.checka + address "address" bibinfo.check output + } + 'skip$ + if$ + } + { + organization address new.block.checkb + organization "organization" bibinfo.check output + address "address" bibinfo.check output + } + if$ + format.edition output + format.date output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + new.block + format.btitle + "title" output.check + new.block + bbl.mthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.date "year" output.check + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + title howpublished new.block.checkb + format.title output + howpublished new.block.checka + howpublished "howpublished" bibinfo.check output + format.date output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry + empty.misc.check +} + +FUNCTION {softmisc} +{ output.bibitem + format.authors output + title howpublished new.block.checkb + format.title output + format.version output + howpublished new.block.checka + howpublished "howpublished" bibinfo.check output + format.date output + new.block + format.url output + new.block + format.note output + %%format.eprint output + format.softmisc.eprint output + fin.entry + empty.misc.check +} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + new.block + format.btitle + "title" output.check + new.block + bbl.phdthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.date "year" output.check + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization "organization" bibinfo.check output + } + { format.editors output.nonnull } + if$ + new.block + format.btitle "title" output.check + format.bvolume output + format.number.series output + editor empty$ + { publisher empty$ + 'skip$ + { + new.sentence + format.publisher.address output + } + if$ + } + { publisher empty$ + { + new.sentence + format.organization.address output } + { + new.sentence + organization "organization" bibinfo.check output + format.publisher.address output + } + if$ + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + new.block + format.title + "title" output.check + new.block + format.tr.number output.nonnull + institution "institution" bibinfo.warn output + address "address" bibinfo.check output + format.date "year" output.check + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + new.block + format.title "title" output.check + format.date output + new.block + format.url output + new.block + format.note "note" output.check + format.eprint output + fin.entry +} + +FUNCTION {default.type} { misc } +READ +STRINGS { longest.label } +INTEGERS { number.label longest.label.width } +FUNCTION {initialize.longest.label} +{ "" 'longest.label := + #1 'number.label := + #0 'longest.label.width := +} +FUNCTION {longest.label.pass} +{ number.label int.to.str$ 'label := + number.label #1 + 'number.label := + label width$ longest.label.width > + { label 'longest.label := + label width$ 'longest.label.width := + } + 'skip$ + if$ +} +EXECUTE {initialize.longest.label} +ITERATE {longest.label.pass} +FUNCTION {begin.bib} +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + "\begin{thebibliography}{" longest.label * "}" * + write$ newline$ + "\expandafter\ifx\csname url\endcsname\relax" + write$ newline$ + %%" \def\url#1{\texttt{#1}}\fi" + " \def\url#1{\burl{#1}}\fi" + write$ newline$ + "\expandafter\ifx\csname urlprefix\endcsname\relax\def\urlprefix{URL }\fi" + write$ newline$ + "\providecommand{\bibinfo}[2]{#2}" + write$ newline$ + "\providecommand{\eprint}[2][]{\url{#2}}" + write$ newline$ + "\providecommand{\doi}[1]{\url{https://doi.org/#1}}" + write$ newline$ + "\bibcommenthead" write$ newline$ +} +EXECUTE {begin.bib} +EXECUTE {init.state.consts} +ITERATE {call.type$} +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} +EXECUTE {end.bib} +%% End of customized bst file +%% +%% End of file `nature.bst'. \ No newline at end of file diff --git a/inst/rmarkdown/templates/springer/skeleton/sn-standardnature.bst b/inst/rmarkdown/templates/springer/skeleton/sn-standardnature.bst new file mode 100644 index 000000000..a552a18a0 --- /dev/null +++ b/inst/rmarkdown/templates/springer/skeleton/sn-standardnature.bst @@ -0,0 +1,1709 @@ +%% +%% This is file `naturemag.bst', +%% generated with the docstrip utility. +%% +%% The original source files were: +%% +%% merlin.mbs (with options: `head,seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% physjour.mbs (with options: `seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% geojour.mbs (with options: `seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% photjour.mbs (with options: `seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% merlin.mbs (with options: `tail,seq-no,nm-rev,ed-rev,jnrlst,nmlm,x5,m1,yr-par,xmth,vol-bf,vnum-x,volp-com,num-xser,jnm-x,bkpg-x,pub-date,edparxc,ppx,ed,abr,xedn,jabr,amper,and-xcom,etal-it,eprint,url,url-blk,bibinfo,nfss,{}') +%% ---------------------------------------- +%% *** Style for the journal Nature (created by Peter Czoschke) *** +%% +%% Copyright 1994-2002 Patrick W Daly + % =============================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files, listed above. + % + % This generated file can be redistributed and/or modified under the terms + % of the LaTeX Project Public License Distributed from CTAN + % archives in directory macros/latex/base/lppl.txt; either + % version 1 of the License, or any later version. + % =============================================================== + % Name and version information of the main mbs file: + % \ProvidesFile{merlin.mbs}[2002/10/21 4.05 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + %------------------------------------------------------------------- + % This bibliography style file is intended for texts in ENGLISH + % This is a numerical citation style, and as such is standard LaTeX. + % It requires no extra package to interface to the main text. + % The form of the \bibitem entries is + % \bibitem{key}... + % Usage of \cite is as follows: + % \cite{key} ==>> [#] + % \cite[chap. 2]{key} ==>> [#, chap. 2] + % where # is a number determined by the ordering in the reference list. + % The order in the reference list is that by which the works were originally + % cited in the text, or that in the database. + %--------------------------------------------------------------------- + +ENTRY + { address + archive + author + booktitle + chapter + edition + editor + eprint + howpublished + institution + journal + key + keywords + month + note + number + organization + pages + publisher + school + series + title + type + url + doi + volume + year + archivePrefix + primaryClass + eid + adsurl + adsnote + version + } + {} + { label } +INTEGERS { output.state before.all mid.sentence after.sentence after.block } +FUNCTION {init.state.consts} +{ #0 'before.all := + #1 'mid.sentence := + #2 'after.sentence := + #3 'after.block := +} +STRINGS { s t} +FUNCTION {output.nonnull} +{ 's := + output.state mid.sentence = + { ", " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +FUNCTION {output.in.nonnull} +{ 's := + output.state mid.sentence = + { ", " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} +FUNCTION {output} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} + +FUNCTION {in.output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.in.nonnull + if$ +} +FUNCTION {fin.entry} +{ add.period$ + write$ + newline$ +} + +FUNCTION {new.block} +{ output.state before.all = + 'skip$ + { after.block 'output.state := } + if$ +} +FUNCTION {new.sentence} +{ output.state after.block = + 'skip$ + { output.state before.all = + 'skip$ + { after.sentence 'output.state := } + if$ + } + if$ +} +FUNCTION {add.blank} +{ " " * before.all 'output.state := +} + +FUNCTION {date.block} +{ + new.block +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} +FUNCTION {new.block.checka} +{ empty$ + 'skip$ + 'new.block + if$ +} +FUNCTION {new.block.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.block + if$ +} +FUNCTION {new.sentence.checka} +{ empty$ + 'skip$ + 'new.sentence + if$ +} +FUNCTION {new.sentence.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.sentence + if$ +} +FUNCTION {field.or.null} +{ duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ +} +FUNCTION {emphasize} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" swap$ * "}" * } + if$ +} +FUNCTION {bolden} +{ duplicate$ empty$ + { pop$ "" } + { "\textbf{" swap$ * "}" * } + if$ +} +FUNCTION {tie.or.space.prefix} +{ duplicate$ text.length$ #3 < + { "~" } + { " " } + if$ + swap$ +} + +FUNCTION {capitalize} +{ "u" change.case$ "t" change.case$ } + +FUNCTION {space.word} +{ " " swap$ * " " * } + % Here are the language-specific definitions for explicit words. + % Each function has a name bbl.xxx where xxx is the English word. + % The language selected here is ENGLISH +FUNCTION {bbl.and} +{ "and"} + +FUNCTION {bbl.etal} +{ "et~al." } + +FUNCTION {bbl.in.editors} +{ "eds " } + +FUNCTION {bbl.editors} +{ "eds" } + +FUNCTION {bbl.editor} +{ "ed." } + +FUNCTION {bbl.edby} +{ "edited by" } + +FUNCTION {bbl.edition} +{ "edn" } + +FUNCTION {bbl.volume} +{ "Vol." } + +FUNCTION {bbl.of} +{ "of" } + +FUNCTION {bbl.number} +{ "no." } + +FUNCTION {bbl.nr} +{ "no." } + +FUNCTION {bbl.in} +{ "in" } + +FUNCTION {bbl.pages} +{ "" } + +FUNCTION {bbl.page} +{ "" } + +FUNCTION {bbl.chapter} +{ "Ch." } + +FUNCTION {bbl.techrep} +{ "Tech. Rep." } + +FUNCTION {bbl.mthesis} +{ "Master's thesis" } + +FUNCTION {bbl.phdthesis} +{ "Ph.D. thesis" } + +MACRO {jan} {"Jan."} + +MACRO {feb} {"Feb."} + +MACRO {mar} {"Mar."} + +MACRO {apr} {"Apr."} + +MACRO {may} {"May"} + +MACRO {jun} {"Jun."} + +MACRO {jul} {"Jul."} + +MACRO {aug} {"Aug."} + +MACRO {sep} {"Sep."} + +MACRO {oct} {"Oct."} + +MACRO {nov} {"Nov."} + +MACRO {dec} {"Dec."} + + %------------------------------------------------------------------- + % Begin module: + % \ProvidesFile{physjour.mbs}[2002/01/14 2.2 (PWD)] +MACRO {aa}{"Astron. \& Astrophys."} +MACRO {aasup}{"Astron. \& Astrophys. Suppl. Ser."} +MACRO {aj} {"Astron. J."} +MACRO {aph} {"Acta Phys."} +MACRO {advp} {"Adv. Phys."} +MACRO {ajp} {"Amer. J. Phys."} +MACRO {ajm} {"Amer. J. Math."} +MACRO {amsci} {"Amer. Sci."} +MACRO {anofd} {"Ann. Fluid Dyn."} +MACRO {am} {"Ann. Math."} +MACRO {ap} {"Ann. Phys. (NY)"} +MACRO {adp} {"Ann. Phys. (Leipzig)"} +MACRO {ao} {"Appl. Opt."} +MACRO {apl} {"Appl. Phys. Lett."} +MACRO {app} {"Astroparticle Phys."} +MACRO {apj} {"Astrophys. J."} +MACRO {apjsup} {"Astrophys. J. Suppl."} +MACRO {apss} {"Astrophys. Space Sci."} +MACRO {araa} {"Ann. Rev. Astron. Astrophys."} +MACRO {baas} {"Bull. Amer. Astron. Soc."} +MACRO {baps} {"Bull. Amer. Phys. Soc."} +MACRO {cmp} {"Comm. Math. Phys."} +MACRO {cpam} {"Commun. Pure Appl. Math."} +MACRO {cppcf} {"Comm. Plasma Phys. \& Controlled Fusion"} +MACRO {cpc} {"Comp. Phys. Comm."} +MACRO {cqg} {"Class. Quant. Grav."} +MACRO {cra} {"C. R. Acad. Sci. A"} +MACRO {fed} {"Fusion Eng. \& Design"} +MACRO {ft} {"Fusion Tech."} +MACRO {grg} {"Gen. Relativ. Gravit."} +MACRO {ieeens} {"IEEE Trans. Nucl. Sci."} +MACRO {ieeeps} {"IEEE Trans. Plasma Sci."} +MACRO {ijimw} {"Interntl. J. Infrared \& Millimeter Waves"} +MACRO {ip} {"Infrared Phys."} +MACRO {irp} {"Infrared Phys."} +MACRO {jap} {"J. Appl. Phys."} +MACRO {jasa} {"J. Acoust. Soc. America"} +MACRO {jcp} {"J. Comp. Phys."} +MACRO {jetp} {"Sov. Phys.--JETP"} +MACRO {jfe} {"J. Fusion Energy"} +MACRO {jfm} {"J. Fluid Mech."} +MACRO {jmp} {"J. Math. Phys."} +MACRO {jne} {"J. Nucl. Energy"} +MACRO {jnec} {"J. Nucl. Energy, C: Plasma Phys., Accelerators, Thermonucl. Res."} +MACRO {jnm} {"J. Nucl. Mat."} +MACRO {jpc} {"J. Phys. Chem."} +MACRO {jpp} {"J. Plasma Phys."} +MACRO {jpsj} {"J. Phys. Soc. Japan"} +MACRO {jsi} {"J. Sci. Instrum."} +MACRO {jvst} {"J. Vac. Sci. \& Tech."} +MACRO {nat} {"Nature"} +MACRO {nature} {"Nature"} +MACRO {nedf} {"Nucl. Eng. \& Design/Fusion"} +MACRO {nf} {"Nucl. Fusion"} +MACRO {nim} {"Nucl. Inst. \& Meth."} +MACRO {nimpr} {"Nucl. Inst. \& Meth. in Phys. Res."} +MACRO {np} {"Nucl. Phys."} +MACRO {npb} {"Nucl. Phys. B"} +MACRO {nt/f} {"Nucl. Tech./Fusion"} +MACRO {npbpc} {"Nucl. Phys. B (Proc. Suppl.)"} +MACRO {inc} {"Nuovo Cimento"} +MACRO {nc} {"Nuovo Cimento"} +MACRO {pf} {"Phys. Fluids"} +MACRO {pfa} {"Phys. Fluids A: Fluid Dyn."} +MACRO {pfb} {"Phys. Fluids B: Plasma Phys."} +MACRO {pl} {"Phys. Lett."} +MACRO {pla} {"Phys. Lett. A"} +MACRO {plb} {"Phys. Lett. B"} +MACRO {prep} {"Phys. Rep."} +MACRO {pnas} {"Proc. Nat. Acad. Sci. USA"} +MACRO {pp} {"Phys. Plasmas"} +MACRO {ppcf} {"Plasma Phys. \& Controlled Fusion"} +MACRO {phitrsl} {"Philos. Trans. Roy. Soc. London"} +MACRO {prl} {"Phys. Rev. Lett."} +MACRO {pr} {"Phys. Rev."} +MACRO {physrev} {"Phys. Rev."} +MACRO {pra} {"Phys. Rev. A"} +MACRO {prb} {"Phys. Rev. B"} +MACRO {prc} {"Phys. Rev. C"} +MACRO {prd} {"Phys. Rev. D"} +MACRO {pre} {"Phys. Rev. E"} +MACRO {ps} {"Phys. Scripta"} +MACRO {procrsl} {"Proc. Roy. Soc. London"} +MACRO {rmp} {"Rev. Mod. Phys."} +MACRO {rsi} {"Rev. Sci. Inst."} +MACRO {science} {"Science"} +MACRO {sciam} {"Sci. Am."} +MACRO {sam} {"Stud. Appl. Math."} +MACRO {sjpp} {"Sov. J. Plasma Phys."} +MACRO {spd} {"Sov. Phys.--Doklady"} +MACRO {sptp} {"Sov. Phys.--Tech. Phys."} +MACRO {spu} {"Sov. Phys.--Uspeki"} +MACRO {st} {"Sky and Telesc."} + % End module: physjour.mbs + %------------------------------------------------------------------- + % Begin module: + % \ProvidesFile{geojour.mbs}[2002/07/10 2.0h (PWD)] +MACRO {aisr} {"Adv. Space Res."} +MACRO {ag} {"Ann. Geophys."} +MACRO {anigeo} {"Ann. Geofis."} +MACRO {angl} {"Ann. Glaciol."} +MACRO {andmet} {"Ann. d. Meteor."} +MACRO {andgeo} {"Ann. d. Geophys."} +MACRO {andphy} {"Ann. Phys.-Paris"} +MACRO {afmgb} {"Arch. Meteor. Geophys. Bioklimatol."} +MACRO {atph} {"Atm\'osphera"} +MACRO {aao} {"Atmos. Ocean"} +MACRO {ass}{"Astrophys. Space Sci."} +MACRO {atenv} {"Atmos. Environ."} +MACRO {aujag} {"Aust. J. Agr. Res."} +MACRO {aumet} {"Aust. Meteorol. Mag."} +MACRO {blmet} {"Bound.-Lay. Meteorol."} +MACRO {bams} {"Bull. Amer. Meteorol. Soc."} +MACRO {cch} {"Clim. Change"} +MACRO {cdyn} {"Clim. Dynam."} +MACRO {cbul} {"Climatol. Bull."} +MACRO {cap} {"Contrib. Atmos. Phys."} +MACRO {dsr} {"Deep-Sea Res."} +MACRO {dhz} {"Dtsch. Hydrogr. Z."} +MACRO {dao} {"Dynam. Atmos. Oceans"} +MACRO {eco} {"Ecology"} +MACRO {empl}{"Earth, Moon and Planets"} +MACRO {envres} {"Environ. Res."} +MACRO {envst} {"Environ. Sci. Technol."} +MACRO {ecms} {"Estuarine Coastal Mar. Sci."} +MACRO {expa}{"Exper. Astron."} +MACRO {geoint} {"Geofis. Int."} +MACRO {geopub} {"Geofys. Publ."} +MACRO {geogeo} {"Geol. Geofiz."} +MACRO {gafd} {"Geophys. Astrophys. Fluid Dyn."} +MACRO {gfd} {"Geophys. Fluid Dyn."} +MACRO {geomag} {"Geophys. Mag."} +MACRO {georl} {"Geophys. Res. Lett."} +MACRO {grl} {"Geophys. Res. Lett."} +MACRO {ga} {"Geophysica"} +MACRO {gs} {"Geophysics"} +MACRO {ieeetap} {"IEEE Trans. Antenn. Propag."} +MACRO {ijawp} {"Int. J. Air Water Pollut."} +MACRO {ijc} {"Int. J. Climatol."} +MACRO {ijrs} {"Int. J. Remote Sens."} +MACRO {jam} {"J. Appl. Meteorol."} +MACRO {jaot} {"J. Atmos. Ocean. Technol."} +MACRO {jatp} {"J. Atmos. Terr. Phys."} +MACRO {jastp} {"J. Atmos. Solar-Terr. Phys."} +MACRO {jce} {"J. Climate"} +MACRO {jcam} {"J. Climate Appl. Meteor."} +MACRO {jcm} {"J. Climate Meteor."} +MACRO {jcy} {"J. Climatol."} +MACRO {jgr} {"J. Geophys. Res."} +MACRO {jga} {"J. Glaciol."} +MACRO {jh} {"J. Hydrol."} +MACRO {jmr} {"J. Mar. Res."} +MACRO {jmrj} {"J. Meteor. Res. Japan"} +MACRO {jm} {"J. Meteor."} +MACRO {jpo} {"J. Phys. Oceanogr."} +MACRO {jra} {"J. Rech. Atmos."} +MACRO {jaes} {"J. Aeronaut. Sci."} +MACRO {japca} {"J. Air Pollut. Control Assoc."} +MACRO {jas} {"J. Atmos. Sci."} +MACRO {jmts} {"J. Mar. Technol. Soc."} +MACRO {jmsj} {"J. Meteorol. Soc. Japan"} +MACRO {josj} {"J. Oceanogr. Soc. Japan"} +MACRO {jwm} {"J. Wea. Mod."} +MACRO {lao} {"Limnol. Oceanogr."} +MACRO {mwl} {"Mar. Wea. Log"} +MACRO {mau} {"Mausam"} +MACRO {meteor} {"``Meteor'' Forschungsergeb."} +MACRO {map} {"Meteorol. Atmos. Phys."} +MACRO {metmag} {"Meteor. Mag."} +MACRO {metmon} {"Meteor. Monogr."} +MACRO {metrun} {"Meteor. Rundsch."} +MACRO {metzeit} {"Meteor. Z."} +MACRO {metgid} {"Meteor. Gidrol."} +MACRO {mwr} {"Mon. Weather Rev."} +MACRO {nwd} {"Natl. Weather Dig."} +MACRO {nzjmfr} {"New Zeal. J. Mar. Freshwater Res."} +MACRO {npg} {"Nonlin. Proc. Geophys."} +MACRO {om} {"Oceanogr. Meteorol."} +MACRO {ocac} {"Oceanol. Acta"} +MACRO {oceanus} {"Oceanus"} +MACRO {paleoc} {"Paleoceanography"} +MACRO {pce} {"Phys. Chem. Earth"} +MACRO {pmg} {"Pap. Meteor. Geophys."} +MACRO {ppom} {"Pap. Phys. Oceanogr. Meteor."} +MACRO {physzeit} {"Phys. Z."} +MACRO {pps} {"Planet. Space Sci."} +MACRO {pss} {"Planet. Space Sci."} +MACRO {pag} {"Pure Appl. Geophys."} +MACRO {qjrms} {"Quart. J. Roy. Meteorol. Soc."} +MACRO {quatres} {"Quat. Res."} +MACRO {rsci} {"Radio Sci."} +MACRO {rse} {"Remote Sens. Environ."} +MACRO {rgeo} {"Rev. Geophys."} +MACRO {rgsp} {"Rev. Geophys. Space Phys."} +MACRO {rdgeo} {"Rev. Geofis."} +MACRO {revmeta} {"Rev. Meteorol."} +MACRO {sgp}{"Surveys in Geophys."} +MACRO {sp} {"Solar Phys."} +MACRO {ssr} {"Space Sci. Rev."} +MACRO {tellus} {"Tellus"} +MACRO {tac} {"Theor. Appl. Climatol."} +MACRO {tagu} {"Trans. Am. Geophys. Union (EOS)"} +MACRO {wrr} {"Water Resour. Res."} +MACRO {weather} {"Weather"} +MACRO {wafc} {"Weather Forecast."} +MACRO {ww} {"Weatherwise"} +MACRO {wmob} {"WMO Bull."} +MACRO {zeitmet} {"Z. Meteorol."} + % End module: geojour.mbs + %------------------------------------------------------------------- + % Begin module: + % \ProvidesFile{photjour.mbs}[1999/02/24 2.0b (PWD)] + +MACRO {appopt} {"Appl. Opt."} +MACRO {bell} {"Bell Syst. Tech. J."} +MACRO {ell} {"Electron. Lett."} +MACRO {jasp} {"J. Appl. Spectr."} +MACRO {jqe} {"IEEE J. Quantum Electron."} +MACRO {jlwt} {"J. Lightwave Technol."} +MACRO {jmo} {"J. Mod. Opt."} +MACRO {josa} {"J. Opt. Soc. America"} +MACRO {josaa} {"J. Opt. Soc. Amer.~A"} +MACRO {josab} {"J. Opt. Soc. Amer.~B"} +MACRO {jdp} {"J. Phys. (Paris)"} +MACRO {oc} {"Opt. Commun."} +MACRO {ol} {"Opt. Lett."} +MACRO {phtl} {"IEEE Photon. Technol. Lett."} +MACRO {pspie} {"Proc. Soc. Photo-Opt. Instrum. Eng."} +MACRO {sse} {"Solid-State Electron."} +MACRO {sjot} {"Sov. J. Opt. Technol."} +MACRO {sjqe} {"Sov. J. Quantum Electron."} +MACRO {sleb} {"Sov. Phys.--Leb. Inst. Rep."} +MACRO {stph} {"Sov. Phys.--Techn. Phys."} +MACRO {stphl} {"Sov. Techn. Phys. Lett."} +MACRO {vr} {"Vision Res."} +MACRO {zph} {"Z. f. Physik"} +MACRO {zphb} {"Z. f. Physik~B"} +MACRO {zphd} {"Z. f. Physik~D"} + +MACRO {CLEO} {"CLEO"} +MACRO {ASSL} {"Adv. Sol.-State Lasers"} +MACRO {OSA} {"OSA"} + % End module: photjour.mbs +%% Copyright 1994-2002 Patrick W Daly +MACRO {acmcs} {"ACM Comput. Surv."} + +MACRO {acta} {"Acta Inf."} + +MACRO {cacm} {"Commun. ACM"} + +MACRO {ibmjrd} {"IBM J. Res. Dev."} + +MACRO {ibmsj} {"IBM Syst.~J."} + +MACRO {ieeese} {"IEEE Trans. Software Eng."} + +MACRO {ieeetc} {"IEEE Trans. Comput."} + +MACRO {ieeetcad} + {"IEEE Trans. Comput. Aid. Des."} + +MACRO {ipl} {"Inf. Process. Lett."} + +MACRO {jacm} {"J.~ACM"} + +MACRO {jcss} {"J.~Comput. Syst. Sci."} + +MACRO {scp} {"Sci. Comput. Program."} + +MACRO {sicomp} {"SIAM J. Comput."} + +MACRO {tocs} {"ACM Trans. Comput. Syst."} + +MACRO {tods} {"ACM Trans. Database Syst."} + +MACRO {tog} {"ACM Trans. Graphic."} + +MACRO {toms} {"ACM Trans. Math. Software"} + +MACRO {toois} {"ACM Trans. Office Inf. Syst."} + +MACRO {toplas} {"ACM Trans. Progr. Lang. Syst."} + +MACRO {tcs} {"Theor. Comput. Sci."} + +FUNCTION {bibinfo.check} +{ swap$ + duplicate$ missing$ + { + pop$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ pop$ + } + { swap$ + "\bibinfo{" swap$ * "}{" * swap$ * "}" * + } + if$ + } + if$ +} +FUNCTION {bibinfo.warn} +{ swap$ + duplicate$ missing$ + { + swap$ "missing " swap$ * " in " * cite$ * warning$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ "empty " swap$ * " in " * cite$ * warning$ + } + { swap$ + "\bibinfo{" swap$ * "}{" * swap$ * "}" * + } + if$ + } + if$ +} +FUNCTION {format.eprint} +{ eprint duplicate$ empty$ + 'skip$ + { "\eprint" + archive empty$ + 'skip$ + { "[" * archive * "]" * } + if$ + "{" * swap$ * "}" * + } + if$ +} +FUNCTION {format.url} +{ url empty$ + { "" } + { "\urlprefix\url{" url * "}" * } + if$ +} + +FUNCTION {format.doi} +{ doi empty$ + { "" } + { "\doi{" doi * "}" * } + if$ +} + +STRINGS { bibinfo} +INTEGERS { nameptr namesleft numnames } + +FUNCTION {format.names} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{vv~}{ll}{, f.}{, jj}" + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + nameptr #1 + #1 + = + numnames #5 + > and + { "others" 't := + #1 'namesleft := } + 'skip$ + if$ + namesleft #1 > + { ", " * t * } + { + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal emphasize * + } + { + "\&" + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} +FUNCTION {format.names.ed} +{ + format.names +} +FUNCTION {format.authors} +{ author "author" format.names +} +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {get.in.bbl.editor} +{ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + " " * + get.bbl.editor + "(" swap$ * ")" * + * + } + if$ +} + +FUNCTION {format.in.editors} +{ "" editor "editor" format.names duplicate$ empty$ 'skip$ + { swap$ "(eds" * + " " * swap$ * + swap$ " " * + swap$ * ")" * + } + if$ +} + +FUNCTION {format.note} +{ + note empty$ + { "" } + { note #1 #1 substring$ + duplicate$ "{" = + 'skip$ + { output.state mid.sentence = + { "l" } + { "u" } + if$ + change.case$ + } + if$ + note #2 global.max$ substring$ * "note" bibinfo.check + } + if$ +} + + + +FUNCTION {format.in.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + " in \textit{" swap$ * "}" * "title" bibinfo.check +} + +FUNCTION {format.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "title" bibinfo.check +} + +FUNCTION {format.inpro.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "title" bibinfo.check + emphasize} + +FUNCTION {format.version} +{ version + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "version" bibinfo.check +} + +%FUNCTION {format.inpro.title} +%{ title +% duplicate$ empty$ 'skip$ +% { "t" change.case$ } +% if$ +% "title" bibinfo.check +% emphasize} + +FUNCTION {output.bibitem} +{ newline$ + "\bibitem{" write$ + cite$ write$ + "}" write$ + newline$ + "" + before.all 'output.state := +} + +FUNCTION {n.dashify} +{ + 't := + "" + { t empty$ not } + { t #1 #1 substring$ "-" = + { t #1 #2 substring$ "--" = not + { "--" * + t #2 global.max$ substring$ 't := + } + { { t #1 #1 substring$ "-" = } + { "-" * + t #2 global.max$ substring$ 't := + } + while$ + } + if$ + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + +FUNCTION {word.in} +{ bbl.in capitalize + " " * } + +FUNCTION {format.date} +{ + "" + duplicate$ empty$ + year "year" bibinfo.check duplicate$ empty$ + { swap$ 'skip$ + { "there's a month but no year in " cite$ * warning$ } + if$ + * + } + { swap$ 'skip$ + { + swap$ + " " * swap$ + } + if$ + * + } + if$ + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + " (" swap$ * ")" * + } + if$ +} +FUNCTION {format.btitle} +{ title "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + emphasize + } + if$ +} +FUNCTION {either.or.check} +{ empty$ + 'pop$ + { "can't use both " swap$ * " fields in " * cite$ * warning$ } + if$ +} +FUNCTION {format.bvolume} +{ volume empty$ + { "" } + { bbl.volume volume tie.or.space.prefix + "volume" bibinfo.check * * + series "series" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ bbl.of space.word * swap$ + emphasize * } + if$ + "volume and number" number either.or.check + } + if$ +} +FUNCTION {format.number.series} +{ volume empty$ + { number empty$ + { series field.or.null } + { series empty$ + { number "number" bibinfo.check } + { output.state mid.sentence = + { bbl.number } + { bbl.number capitalize } + if$ + number tie.or.space.prefix "number" bibinfo.check * * + bbl.in space.word * + series "series" bibinfo.check * + } + if$ + } + if$ + } + { "" } + if$ +} + +FUNCTION {format.edition} +{ edition duplicate$ empty$ 'skip$ + { + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + " " * bbl.edition * + } + if$ +} +INTEGERS { multiresult } +FUNCTION {multi.page.check} +{ 't := + #0 'multiresult := + { multiresult not + t empty$ not + and + } + { t #1 #1 substring$ + duplicate$ "-" = + swap$ duplicate$ "," = + swap$ "+" = + or or + { #1 'multiresult := } + { t #2 global.max$ substring$ 't := } + if$ + } + while$ + multiresult +} +FUNCTION {format.pages} +{ pages duplicate$ empty$ 'skip$ + { duplicate$ multi.page.check + { + n.dashify + } + { + } + if$ + "pages" bibinfo.check + } + if$ +} +FUNCTION {format.journal.pages} +{ pages duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ + { pop$ pop$ format.pages } + { + ", " * + swap$ + n.dashify + "pages" bibinfo.check + * + } + if$ + } + if$ +} +FUNCTION {format.number} + {number empty$ + 'skip$ + { "~(" number * ")" * * } + if$ + } +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + bolden + format.number + format.journal.pages +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + 'format.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + pages empty$ + 'skip$ + { ", " * format.pages * } + if$ + } + if$ +} + +FUNCTION {format.booktitle} +{ + booktitle "booktitle" bibinfo.check + emphasize +} +FUNCTION {format.in.ed.booktitle} +{ duplicate$ empty$ 'skip$ + { +editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { +format.booktitle swap$ +"(" editor num.names$ #1 > 'bbl.in.editors 'bbl.editor if$ * swap$ ") " * + * swap$ + * } + if$ + } + if$ +} +FUNCTION {empty.misc.check} +{ author empty$ title empty$ howpublished empty$ + month empty$ year empty$ note empty$ + and and and and and + { "all relevant fields are empty in " cite$ * warning$ } + 'skip$ + if$ +} +FUNCTION {format.thesis.type} +{ type duplicate$ empty$ + 'pop$ + { swap$ pop$ + "t" change.case$ "type" bibinfo.check + } + if$ +} +FUNCTION {format.tr.number} +{ number "number" bibinfo.check + type duplicate$ empty$ + { pop$ bbl.techrep } + 'skip$ + if$ + "type" bibinfo.check + swap$ duplicate$ empty$ + { pop$ "t" change.case$ } + { tie.or.space.prefix * * } + if$ +} +FUNCTION {format.article.crossref} +{ + key duplicate$ empty$ + { pop$ + journal duplicate$ empty$ + { "need key or journal for " cite$ * " to crossref " * crossref * warning$ } + { "journal" bibinfo.check emphasize word.in swap$ * } + if$ + } + { word.in swap$ * " " *} + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.crossref.editor} +{ editor #1 "{vv~}{ll}" format.name$ + "editor" bibinfo.check + editor num.names$ duplicate$ + #2 > + { pop$ + "editor" bibinfo.check + " " * bbl.etal + emphasize + * + } + { #2 < + 'skip$ + { editor #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + "editor" bibinfo.check + " " * bbl.etal + emphasize + * + } + { + " \& " + * editor #2 "{vv~}{ll}" format.name$ + "editor" bibinfo.check + * + } + if$ + } + if$ + } + if$ +} +FUNCTION {format.book.crossref} +{ volume duplicate$ empty$ + { "empty volume in " cite$ * "'s crossref of " * crossref * warning$ + pop$ word.in + } + { bbl.volume + capitalize + swap$ tie.or.space.prefix "volume" bibinfo.check * * bbl.of space.word * + } + if$ + editor empty$ + editor field.or.null author field.or.null = + or + { key empty$ + { series empty$ + { "need editor, key, or series for " cite$ * " to crossref " * + crossref * warning$ + "" * + } + { series emphasize * } + if$ + } + { key * } + if$ + } + { format.crossref.editor * } + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.incoll.inproc.crossref} +{ + editor empty$ + editor field.or.null author field.or.null = + or + { key empty$ + { format.booktitle duplicate$ empty$ + { "need editor, key, or booktitle for " cite$ * " to crossref " * + crossref * warning$ + } + { word.in swap$ * } + if$ + } + { word.in key * " " *} + if$ + } + { word.in format.crossref.editor * " " *} + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.org.or.pub} +{ 't := + "" + year empty$ + { "empty year in " cite$ * warning$ } + 'skip$ + if$ + address empty$ t empty$ and + year empty$ and + 'skip$ + { + add.blank "(" * + t empty$ + { address "address" bibinfo.check * + } + { t * + address empty$ + 'skip$ + { ", " * address "address" bibinfo.check * } + if$ + } + if$ + year empty$ + 'skip$ + { t empty$ address empty$ and + 'skip$ + { ", " * } + if$ + year "year" bibinfo.check + * + } + if$ + ")" * + } + if$ +} +FUNCTION {format.publisher.address} +{ publisher "publisher" bibinfo.warn format.org.or.pub +} + +FUNCTION {format.organization.address} +{ organization "organization" bibinfo.check format.org.or.pub +} + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { " {[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.soft.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ + "eprint" bibinfo.check +} + +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + new.block + format.title "title" output.check + new.block + crossref missing$ + { + journal + "journal" bibinfo.check + emphasize + "journal" output.check + add.blank + format.vol.num.pages output + format.date "year" output.check + } + { format.article.crossref output.nonnull + format.pages output + } + if$ + new.block + format.url output + new.block + format.doi output + format.note output + %%format.eprint output + format.soft.eprint output + add.blank + format.primaryClass output + fin.entry +} +FUNCTION {book} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + add.blank + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + new.block + format.btitle "title" output.check + add.blank + format.edition output + crossref missing$ + { format.bvolume output + new.block + format.number.series output + new.sentence + format.publisher.address output + } + { + new.block + format.book.crossref output.nonnull + format.date "year" output.check + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} +FUNCTION {booklet} +{ output.bibitem + format.authors output + new.block + format.title "title" output.check + new.block + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + format.date output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + new.block + format.btitle "title" output.check + crossref missing$ + { + format.bvolume output + format.chapter.pages "chapter and pages" output.check + new.block + format.number.series output + new.sentence + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + new.block + format.book.crossref output.nonnull + format.date "year" output.check + } + if$ + format.edition output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + new.block + format.in.title "title" output.check + add.blank + format.edition output +% new.block + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.bvolume output + add.blank + format.number.series output + format.chapter.pages output + new.sentence + format.publisher.address output + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + new.block + format.editors output +add.blank + format.inpro.title "title" output.check + new.block + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.bvolume output + format.number.series output + format.pages output + new.sentence + publisher empty$ + { format.organization.address output } + { organization "organization" bibinfo.check output + format.publisher.address output + } + if$ + } + { format.incoll.inproc.crossref output.nonnull + format.pages output + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} +FUNCTION {conference} { inproceedings } +FUNCTION {manual} +{ output.bibitem + author empty$ + { organization "organization" bibinfo.check + duplicate$ empty$ 'pop$ + { output + address "address" bibinfo.check output + } + if$ + } + { format.authors output.nonnull } + if$ + new.block + format.btitle "title" output.check + author empty$ + { organization empty$ + { + address new.block.checka + address "address" bibinfo.check output + } + 'skip$ + if$ + } + { + organization address new.block.checkb + organization "organization" bibinfo.check output + address "address" bibinfo.check output + } + if$ + format.edition output + format.date output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + new.block + format.btitle + "title" output.check + new.block + bbl.mthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.date "year" output.check + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + title howpublished new.block.checkb + format.title output + howpublished new.block.checka + howpublished "howpublished" bibinfo.check output + format.date output + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry + empty.misc.check +} + +FUNCTION {softmisc} +{ output.bibitem + format.authors output + title howpublished new.block.checkb + format.title output + format.version output + howpublished new.block.checka + howpublished "howpublished" bibinfo.check output + format.date output + new.block + format.url output + new.block + format.note output + %%format.eprint output + format.softmisc.eprint output + fin.entry + empty.misc.check +} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + new.block + format.btitle + "title" output.check + new.block + bbl.phdthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.date "year" output.check + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization "organization" bibinfo.check output + } + { format.editors output.nonnull } + if$ + new.block + format.btitle "title" output.check + format.bvolume output + format.number.series output + editor empty$ + { publisher empty$ + 'skip$ + { + new.sentence + format.publisher.address output + } + if$ + } + { publisher empty$ + { + new.sentence + format.organization.address output } + { + new.sentence + organization "organization" bibinfo.check output + format.publisher.address output + } + if$ + } + if$ + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + new.block + format.title + "title" output.check + new.block + format.tr.number output.nonnull + institution "institution" bibinfo.warn output + address "address" bibinfo.check output + format.date "year" output.check + new.block + format.url output + new.block + format.note output + format.eprint output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + new.block + format.title "title" output.check + format.date output + new.block + format.url output + new.block + format.note "note" output.check + format.eprint output + fin.entry +} + +FUNCTION {default.type} { misc } +READ +STRINGS { longest.label } +INTEGERS { number.label longest.label.width } +FUNCTION {initialize.longest.label} +{ "" 'longest.label := + #1 'number.label := + #0 'longest.label.width := +} +FUNCTION {longest.label.pass} +{ number.label int.to.str$ 'label := + number.label #1 + 'number.label := + label width$ longest.label.width > + { label 'longest.label := + label width$ 'longest.label.width := + } + 'skip$ + if$ +} +EXECUTE {initialize.longest.label} +ITERATE {longest.label.pass} +FUNCTION {begin.bib} +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + "\begin{thebibliography}{" longest.label * "}" * + write$ newline$ + "\expandafter\ifx\csname url\endcsname\relax" + write$ newline$ + %%" \def\url#1{\texttt{#1}}\fi" + " \def\url#1{\burl{#1}}\fi" + write$ newline$ + "\expandafter\ifx\csname urlprefix\endcsname\relax\def\urlprefix{URL }\fi" + write$ newline$ + "\providecommand{\bibinfo}[2]{#2}" + write$ newline$ + "\providecommand{\eprint}[2][]{\url{#2}}" + write$ newline$ + "\providecommand{\doi}[1]{\url{https://doi.org/#1}}" + write$ newline$ + "\bibcommenthead" write$ newline$ +} +EXECUTE {begin.bib} +EXECUTE {init.state.consts} +ITERATE {call.type$} +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} +EXECUTE {end.bib} +%% End of customized bst file +%% +%% End of file `nature.bst'. \ No newline at end of file diff --git a/inst/rmarkdown/templates/springer/skeleton/sn-vancouver.bst b/inst/rmarkdown/templates/springer/skeleton/sn-vancouver.bst new file mode 100644 index 000000000..5af90528b --- /dev/null +++ b/inst/rmarkdown/templates/springer/skeleton/sn-vancouver.bst @@ -0,0 +1,2033 @@ +%% +%% This `vancouver.bst' bibliographic style file (for LaTeX/BibTeX) is +%% generated with the docstrip utility and modified manually to meet the +%% ``Uniform Requirements for Manuscripts Submitted to Biomedical Journals'' +%% as published in N Engl J Med 1997;336:309-315. +%% (also known as the Vancouver style) +%% This specification may be found on the web page of the +%% International Committe of Medical Journal Editors: +%% +%% http://www.icmje.org +%% +%%------------------------------------------------------------------- +%% +%% Copyright 2004 Folkert van der Beek +%% +%% This work may be distributed and/or modified under the +%% conditions of the LaTeX Project Public License, either version 1.3 +%% of this license or (at your option) any later version. +%% The latest version of this license is in +%% http://www.latex-project.org/lppl.txt +%% and version 1.3 or later is part of all distributions of LaTeX +%% version 2005/12/01 or later. +%% +%% This work has the LPPL maintenance status `maintained'. +%% +%% The Current Maintainer of this work is Folkert van der Beek. +%% +%% Complaints, suggestions and comments may be sent to +%% +%% Folkert van der Beek +%% +%%------------------------------------------------------------------- +%% +%% This bibliography style file is intended for texts in ENGLISH +%% This is a numerical citation style, and as such is standard LaTeX. +%% It requires no extra package to interface to the main text. +%% The form of the \bibitem entries is +%% \bibitem{key}... +%% Usage of \cite is as follows: +%% \cite{key} ==>> [#] +%% \cite[chap. 2]{key} ==>> [#, chap. 2] +%% where # is a number determined by the ordering in the reference list. +%% The order in the reference list is that by which the works were originally +%% cited in the text, or that in the database. + % +%% To change the reference numbering system from [1] to 1, +%% put the following code in the preamble: +%% \makeatletter % Reference list option change +%% \renewcommand\@biblabel[1]{#1} % from [1] to 1 +%% \makeatother % +%% +%%--------------------------------------------------------------------- + +%% List of all possible fields +ENTRY + { address + assignee % for patents + author + booktitle % for articles in books + chapter % for incollection, esp. internet documents + cartographer % for maps + day + edition + editor + howpublished + institution % for technical reports + inventor % for patents + journal + key + keywords + month + note + number + organization + pages + part + publisher + school + series + title + type + volume + word + year + eprint % urlbst + doi % urlbst + url % urlbst + lastchecked % urlbst + updated % urlbst + archive + archivePrefix + primaryClass + eid + adsurl + adsnote + version + } + {} + { label } +%% Declaration of integer variables +INTEGERS { output.state before.all mid.sentence after.sentence after.block } +STRINGS { urlintro eprinturl eprintprefix doiprefix doiurl } % urlbst... +INTEGERS { hrefform addeprints adddoiresolver } +% Following constants may be adjusted by hand, if desired +FUNCTION {init.config.constants} +{ + "Available from: " 'urlintro := % prefix before URL + "http://arxiv.org/abs/" 'eprinturl := % prefix to make URL from eprint ref + "arXiv:" 'eprintprefix := % text prefix printed before eprint ref + "http://dx.doi.org/" 'doiurl := % prefix to make URL from DOI + "" 'doiprefix := % text prefix printed before DOI ref + #0 'addeprints := % 0=no eprints; 1=include eprints + #0 'adddoiresolver := % 0=no DOI resolver; 1=include it + #0 'hrefform := % 0=no crossrefs; 1=hypertex xrefs; 2=hyperref refs +} +INTEGERS { + bracket.state + outside.brackets + open.brackets + within.brackets + close.brackets +} +% ...urlbst to here +FUNCTION {init.state.consts} +{ #0 'outside.brackets := % urlbst + #1 'open.brackets := + #2 'within.brackets := + #3 'close.brackets := + + #0 'before.all := + #1 'mid.sentence := + #2 'after.sentence := + #3 'after.block := +} +%% Declaration of string variables +STRINGS { s t} + +% urlbst +FUNCTION {output.nonnull.original} +{ 's := + output.state mid.sentence = + { ". " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +% urlbst... +FUNCTION {output.nonnull} +{ % Save the thing we've been asked to output + 's := + % If the bracket-state is close.brackets, then add a close-bracket to + % what is currently at the top of the stack, and set bracket.state + % to outside.brackets + bracket.state close.brackets = + { "]" * + outside.brackets 'bracket.state := + } + 'skip$ + if$ + bracket.state outside.brackets = + { % We're outside all brackets -- this is the normal situation. + % Write out what's currently at the top of the stack, using the + % original output.nonnull function. + s + output.nonnull.original + } + { % Still in brackets. Add open-bracket or (continuation) comma, add the + % new text (in s) to the top of the stack, and move to the close-brackets + % state, ready for next time (unless inbrackets resets it). If we come + % into this branch, then output.state is carefully undisturbed. + bracket.state open.brackets = + { " [" * } + { ", " * } % bracket.state will be within.brackets + if$ + s * + close.brackets 'bracket.state := + } + if$ +} + +% Call this function just before adding something which should be presented in +% brackets. bracket.state is handled specially within output.nonnull. +FUNCTION {inbrackets} +{ bracket.state close.brackets = + { within.brackets 'bracket.state := } % reset the state: not open nor closed + { open.brackets 'bracket.state := } + if$ +} + +FUNCTION {format.lastchecked} +{ lastchecked empty$ + { "" } + { updated empty$ + { inbrackets "cited " lastchecked * } + { inbrackets "updated " updated * "; cited " * lastchecked * } + if$ + } + if$ +} +% ...urlbst to here + +FUNCTION {output} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} + +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} + +FUNCTION {fin.entry} +{ + bracket.state close.brackets = % urlbst + { "]" * } + 'skip$ + if$ + add.period$ + write$ + newline$ +} + +FUNCTION {new.block} +{ output.state before.all = + 'skip$ + { after.block 'output.state := } + if$ +} + +FUNCTION {new.sentence} +{ output.state after.block = + 'skip$ + { output.state before.all = + 'skip$ + { after.sentence 'output.state := } + if$ + } + if$ +} + +FUNCTION {add.blank} +{ " " * before.all 'output.state := +} + +FUNCTION {no.blank.or.punct} +{ "" * before.all 'output.state := +} + +FUNCTION {add.semicolon} +{ + ";" * + no.blank.or.punct +} + + +FUNCTION {misc.add.colon} +{ + ": " * + } + +FUNCTION {misc.add.comma} +{ + ", " * + } + +FUNCTION {date.block} +{ + "." * + no.blank.or.punct +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% LOGICAL `NOT', `AND', AND `OR' % +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% Logical 'not': +% If the first element on the stack is A then this function +% does the following: +% push { #0 } +% push { #1 } +% So now the first 3 elements of the stack are +% { #1 } { #0 } A +% The first 3 are popped and subjected to 'if': +% If A > 0 then { #0 } is executed, else { #1 } is executed: +% if A > 0 +% then 0 +% else 1 +% So consider integers as logicals, where 1 = true and 0 = false, +% then this does +% (if A then false else true) +% which is a logical 'not'. + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% Logical 'and': +% If the first 2 elements on the stack are A B +% then this function does the following: +% push 'skip$ +% push { pop$ #0 } +% So now first 4 elements are +% { pop$ #0 } 'skip$ A B +% The first 3 are popped and subjected to 'if' (B is on top of +% the stack): +% If A > 0 then 'skip$ is executed, else { pop$ #0 } is executed: +% if A > 0 +% then (B stays on top of stack) +% else (B is popped and #0 is pushed) +% So consider integers as logicals, where 1 = true and 0 = false, +% then this does +% (if A then B else false) +% which is a logical 'and'. + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% Logical 'or': +% If the first 2 elements on the stack are A B +% then this function does the following: +% push { pop$ #1 } +% push 'skip$ +% So now first 4 elements are +% 'skip$ { pop$ #1 } A B +% The first 3 are popped and subjected to 'if' (B is on top of +% the stack): +% If A > 0 then { pop$ #1 } is executed, else 'skip$ is executed: +% if A > 0 +% then (B is popped and #1 is pushed) +% else (B stays on top of stack) +% So consider integers as logicals, where 1 = true and 0 = false, +% then this does +% (if A then true else B) +% which is a logical 'or'. + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% GENERAL PURPOSE FUNCTIONS FOR FORMATTING % +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% issues warning if field is empty +% call with +% "field" field warning.if.empty +% Note that the first field must be between quotes +% because it is the fieldname for use in the warning message. +% + +FUNCTION {warning.if.empty} +{ empty$ + { "No " swap$ * " in " * cite$ * warning$ } + { pop$ } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % encloses string in pre- and postfix string + % call with + % prefix postfix S enclose.check + % delivers empty string if S empty + % +FUNCTION {enclose.check} +{ duplicate$ empty$ + { pop$ pop$ pop$ + "" + } + { swap$ * * } + if$ +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +% emphasizes top of stack +% call with +% string" emphasize.check +% + +FUNCTION {emphasize.check} +{ "\Bem{" swap$ + "}" swap$ + enclose.check +} + + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % brackets top of stack + % call with + % "string" bracket.check + % +FUNCTION {bracket.check} +{ "[" swap$ + "]" swap$ + enclose.check +} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + % + % parenthesizes top of stack + % call with + % "string" parenthesize + % +FUNCTION {parenthesize.check} +{ "(" swap$ + ")" swap$ + enclose.check +} + +STRINGS {z} + +FUNCTION {remove.dots} +{ 'z := % expects string on top of the stack, pops the string and assigns it to variable z + "" % push empty string + { z empty$ not } % returns 0 if variable z is empty + { z #1 #1 substring$ % push the first character of variable z + z #2 global.max$ substring$ 'z := % assigns the 2nd to last character of variable z to variable z + duplicate$ "\" = % pushes 1 if the last character is "\", otherwise 0 + { * % concatenates the last 2 literals + z #1 #1 substring$ % push the first character of variable z + z #2 global.max$ substring$ 'z := % assigns the 2nd to last character of variable z to variable z + * % concatenates the last 2 literals, i.e. every character, even a dot, following a "\" will be printed + } + { duplicate$ "." = % pushes 1 if the last character is ".", otherwise 0 + 'pop$ % pushes the pop$ function + { * } % concatenates the last 2 literals + if$ % pops the last character if it is a dot, otherwise concatenates it with the string on top of the stack + } + if$ + } + while$ +} + +INTEGERS {l} +FUNCTION{string.length} +{ + #1 'l := + { duplicate$ duplicate$ #1 l substring$ = not } + { l #1 + 'l := } + while$ + pop$ l +} + +STRINGS {replace find text} +INTEGERS {find_length} +FUNCTION {find.replace} +{ + 'replace := + 'find := + 'text := + find string.length 'find_length := + "" + { text empty$ not } + { text #1 find_length substring$ find = + { + replace * + text #1 find_length + global.max$ substring$ 'text := + } + { text #1 #1 substring$ * + text #2 global.max$ substring$ 'text := + } + if$ + } + while$ +} + +FUNCTION {new.block.checka} +{ empty$ + 'skip$ + 'new.block + if$ +} + +FUNCTION {new.block.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.block + if$ +} + +FUNCTION {new.sentence.checka} +{ empty$ + 'skip$ + 'new.sentence + if$ +} + +FUNCTION {new.sentence.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.sentence + if$ +} + +FUNCTION {field.or.null} +{ duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ +} + +FUNCTION {emphasize} +{ skip$ } + +FUNCTION {tie.or.space.prefix} +{ duplicate$ text.length$ #3 < + { "~" } + { " " } + if$ + swap$ +} + +FUNCTION {capitalize} +{ "u" change.case$ "t" change.case$ } + +FUNCTION {space.word} +{ " " swap$ * " " * } + + % Here are the language-specific definitions for explicit words. + % Each function has a name bbl.xxx where xxx is the English word. + % The language selected here is ENGLISH + +FUNCTION {bbl.and} +{ "and"} + +FUNCTION {bbl.etal} +{ "et~al." } + +FUNCTION {bbl.editors} +{ "editors" } + +FUNCTION {bbl.editor} +{ "editor" } + +FUNCTION {bbl.cartographers} +{ "cartographers" } + +FUNCTION {bbl.cartographer} +{ "cartographer" } + +FUNCTION {bbl.inventors} +{ "inventors" } + +FUNCTION {bbl.inventor} +{ "inventor" } + +FUNCTION {bbl.assignees} +{ "assignees" } + +FUNCTION {bbl.assignee} +{ "assignee" } + +FUNCTION {bbl.edby} +{ "edited by" } + +FUNCTION {bbl.edition} +{ "ed." } + +FUNCTION {bbl.volume} +{ "vol." } + +FUNCTION {bbl.of} +{ "of" } + +FUNCTION {bbl.number} +{ "no." } + +FUNCTION {bbl.nr} +{ "no." } + +FUNCTION {bbl.in} +{ "in" } + +FUNCTION {bbl.pages} +{ "p." } + +FUNCTION {bbl.page} +{ "p." } + +FUNCTION {bbl.chapter} +{ "chap." } + +FUNCTION {bbl.techrep} +{ "Tech. Rep." } + +FUNCTION {bbl.mthesis} +{ "Master's thesis" } + +FUNCTION {bbl.phdthesis} +{ "Ph.D. thesis" } + +FUNCTION {bbl.first} +{ "1st" } + +FUNCTION {bbl.second} +{ "2nd" } + +FUNCTION {bbl.third} +{ "3rd" } + +FUNCTION {bbl.fourth} +{ "4th" } + +FUNCTION {bbl.fifth} +{ "5th" } + +FUNCTION {bbl.st} +{ "st" } + +FUNCTION {bbl.nd} +{ "nd" } + +FUNCTION {bbl.rd} +{ "rd" } + +FUNCTION {bbl.th} +{ "th" } + +MACRO {jan} {"Jan."} + +MACRO {feb} {"Feb."} + +MACRO {mar} {"Mar."} + +MACRO {apr} {"Apr."} + +MACRO {may} {"May"} + +MACRO {jun} {"Jun."} + +MACRO {jul} {"Jul."} + +MACRO {aug} {"Aug."} + +MACRO {sep} {"Sep."} + +MACRO {oct} {"Oct."} + +MACRO {nov} {"Nov."} + +MACRO {dec} {"Dec."} + +FUNCTION {eng.ord} +{ duplicate$ "1" swap$ * + #-2 #1 substring$ "1" = + { bbl.th * } + { duplicate$ #-1 #1 substring$ + duplicate$ "1" = + { pop$ bbl.st * } + { duplicate$ "2" = + { pop$ bbl.nd * } + { "3" = + { bbl.rd * } + { bbl.th * } + if$ + } + if$ + } + if$ + } + if$ +} + +FUNCTION {bibinfo.check} +{ swap$ + duplicate$ missing$ + { + pop$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ pop$ + } + { swap$ + pop$ + } + if$ + } + if$ +} + +FUNCTION {bibinfo.warn} +{ swap$ + duplicate$ missing$ + { + swap$ "missing " swap$ * " in " * cite$ * warning$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ "empty " swap$ * " in " * cite$ * warning$ + } + { swap$ + pop$ + } + if$ + } + if$ +} + +STRINGS { bibinfo} +INTEGERS { nameptr namesleft numnames } + +FUNCTION {format.names} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + "." ". " find.replace 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{vv~}{ll}{ f{}}{ jj}" + format.name$ + remove.dots + bibinfo bibinfo.check + 't := + nameptr #1 > + { + nameptr #6 + #1 + = + numnames #6 + > and + { "others" 't := + #1 'namesleft := } + 'skip$ + if$ + namesleft #1 > + { ", " * t * } + { + "," * + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal * + } + { " " * t * } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} + +FUNCTION {format.names.org} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{ff~}{vv~}{ll}" + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + namesleft #1 > + { "; " * t * } + { + ";" * + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal * + } + { " " * t * } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} + +FUNCTION {format.names.ed} +{ + format.names +} + +FUNCTION {format.authors} +{ + author "author" format.names + %%"." " " "author" find.replace format.names +} + +FUNCTION {format.organizations} +{ organization "organization" format.names.org +} + +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {get.bbl.cartographer} +{ cartographer num.names$ #1 > 'bbl.cartographers 'bbl.cartographer if$ } + +FUNCTION {get.bbl.inventor} +{ inventor num.names$ #1 > 'bbl.inventors 'bbl.inventor if$ } + +FUNCTION {get.bbl.assignee} +{ assignee num.names$ #1 > 'bbl.assignees 'bbl.assignee if$ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.editor + * + } + if$ +} + +FUNCTION {format.assignees} +{ assignee "assignee" format.names.org duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.assignee + * + } + if$ +} + +FUNCTION {format.cartographers} +{ cartographer "cartographer" format.names duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.cartographer + * + } + if$ +} + +FUNCTION {format.inventors} +{ inventor "inventor" format.names duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.inventor + * + } + if$ +} + +FUNCTION {format.note} +{ + note empty$ + { "" } + { note #1 #1 substring$ + duplicate$ "{" = + 'skip$ + { output.state mid.sentence = + { "l" } + { "u" } + if$ + change.case$ + } + if$ + note #2 global.max$ substring$ * "note" bibinfo.check + } + if$ +} + +FUNCTION {format.title} +{ title +%%duplicate$ empty$ 'skip$ +%% { "t" change.case$ } +%%if$ + "title" bibinfo.check +} + +FUNCTION {format.type} +{ type empty$ + 'skip$ + { inbrackets type } + %%{ add.blank "[" type * "]" * } + if$ +} + +FUNCTION {cite.author.editor} +{ 's := + s #1 "{vv~}{ll}" format.name$ + s num.names$ duplicate$ + #2 > + { pop$ " et~al." * } + { #2 = + { s #2 "{vv~}{ll}{ jj}{ f}" format.name$ "others" = + { " et~al." * } + { " and " * s #2 "{vv~}{ll}" format.name$ * } + if$ + } + 'skip$ + if$ + } + if$ +} + +FUNCTION {check.auth.edit.org} +{author empty$ + { + editor empty$ + { + organization empty$ + {""} + {organization} + if$ + } + {editor cite.author.editor} + if$ + } + {author cite.author.editor} + if$ +} + +FUNCTION {check.year} +{ year empty$ + {""} + {year} + if$ +} + +FUNCTION {output.bibitem} +{ outside.brackets 'bracket.state := % urlbst + newline$ + "\bibitem[\protect\citeauthoryear{" write$ +check.auth.edit.org write$ +"}{" write$ check.year write$ "}]{" write$ cite$ write$ + "}" write$ + newline$ + "" + before.all 'output.state := +} + +FUNCTION {n.dashify} +{ + 't := + "" + { t empty$ not } + { t #1 #1 substring$ "-" = + { t #1 #2 substring$ "--" = not + { "--" * + t #2 global.max$ substring$ 't := + } + { { t #1 #1 substring$ "-" = } + { "-" * + t #2 global.max$ substring$ 't := + } + while$ + } + if$ + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + +FUNCTION {word.in} +{ bbl.in capitalize + ":" * + " " * } + +FUNCTION {format.journal.date} +{ + month "month" bibinfo.check + duplicate$ empty$ + year "year" bibinfo.check duplicate$ empty$ + { + swap$ 'skip$ + { "there's a month but no year in " cite$ * warning$ } + if$ + * + } + { swap$ 'skip$ + { + " " * swap$ + } + if$ + * + remove.dots + } + if$ + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + after.sentence 'output.state := + } + if$ +} + +FUNCTION {format.date} +{ + no.blank.or.punct + ";" + duplicate$ empty$ + year "year" bibinfo.check duplicate$ empty$ + { swap$ 'skip$ + { "there's a month but no year in " cite$ * warning$ } + if$ + * + } + { swap$ 'skip$ + { + swap$ + " " * swap$ + } + if$ + * + } + if$ +} + +FUNCTION {format.btitle} +{ title "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + } + if$ +} + +FUNCTION {either.or.check} +{ empty$ + 'pop$ + { "can't use both " swap$ * " fields in " * cite$ * warning$ } + if$ +} + +FUNCTION {format.bvolume} +{ volume empty$ + { "" } + { bbl.volume volume tie.or.space.prefix + "volume" bibinfo.check * * + series "series" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ bbl.of space.word * swap$ + emphasize * } + if$ + "volume and number" number either.or.check + } + if$ +} + +FUNCTION {format.number.series} +{ volume empty$ + { number empty$ + { series field.or.null } + { series empty$ + { number "number" bibinfo.check } + { output.state mid.sentence = + { bbl.number } + { bbl.number capitalize } + if$ + number tie.or.space.prefix "number" bibinfo.check * * + bbl.in space.word * + series "series" bibinfo.check * + } + if$ + } + if$ + } + { "" } + if$ +} + +FUNCTION {is.num} +{ chr.to.int$ + duplicate$ "0" chr.to.int$ < not + swap$ "9" chr.to.int$ > not and +} + +FUNCTION {extract.num} +{ duplicate$ 't := + "" 's := + { t empty$ not } + { t #1 #1 substring$ + t #2 global.max$ substring$ 't := + duplicate$ is.num + { s swap$ * 's := } + { pop$ "" 't := } + if$ + } + while$ + s empty$ + 'skip$ + { pop$ s } + if$ +} + +FUNCTION {convert.edition} +{ extract.num "l" change.case$ 's := + s "first" = s "1" = or + { bbl.first 't := } + { s "second" = s "2" = or + { bbl.second 't := } + { s "third" = s "3" = or + { bbl.third 't := } + { s "fourth" = s "4" = or + { bbl.fourth 't := } + { s "fifth" = s "5" = or + { bbl.fifth 't := } + { s #1 #1 substring$ is.num + { s eng.ord 't := } + { edition 't := } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + } + if$ + t +} + +FUNCTION {format.edition} +{ edition duplicate$ empty$ 'skip$ + { + convert.edition + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + " " * bbl.edition * + } + if$ +} +INTEGERS { multiresult } +FUNCTION {multi.page.check} +{ 't := + #0 'multiresult := + { multiresult not + t empty$ not + and + } + { t #1 #1 substring$ + duplicate$ "-" = + swap$ duplicate$ "," = + swap$ "+" = + or or + { #1 'multiresult := } + { t #2 global.max$ substring$ 't := } + if$ + } + while$ + multiresult +} + +FUNCTION {format.pages} +{ pages duplicate$ empty$ 'skip$ + { duplicate$ multi.page.check + { + bbl.pages swap$ + n.dashify + } + { + bbl.page swap$ + } + if$ + tie.or.space.prefix + "pages" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.journal.pages} +{ pages duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ + { pop$ pop$ format.pages } + { + ":" * + swap$ + n.dashify + "pages" bibinfo.check + * + } + if$ + } + if$ +} + +FUNCTION {format.vol.num} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + number "number" bibinfo.check duplicate$ empty$ 'skip$ + { + swap$ duplicate$ empty$ + { "there's a number but no volume in " cite$ * warning$ } + 'skip$ + if$ + swap$ + "(" swap$ * ")" * + } + if$ * +} + +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + number "number" bibinfo.check duplicate$ empty$ 'skip$ + { + swap$ duplicate$ empty$ + { "there's a number but no volume in " cite$ * warning$ } + 'skip$ + if$ + swap$ + "(" swap$ * ")" * + } + if$ * + format.journal.pages +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + 'format.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + pages empty$ + 'skip$ + { ", " * format.pages * } + if$ + } + if$ + } + + FUNCTION {format.booktitle} + { + booktitle "booktitle" bibinfo.check + } + + FUNCTION {format.in.ed.booktitle} + { format.booktitle duplicate$ empty$ 'skip$ + { + editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { + "," * + " " * + get.bbl.editor + ". " * + * swap$ + * } + if$ + word.in swap$ * + } + if$ + } + + FUNCTION {format.in.ed.title} + { format.title duplicate$ empty$ 'skip$ + { + editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { + "," * + " " * + get.bbl.editor + ". " * + * swap$ + * } + if$ + word.in swap$ * + } + if$ + } + + FUNCTION {empty.misc.check} + { author empty$ title empty$ howpublished empty$ + month empty$ year empty$ note empty$ + and and and and and + { "all relevant fields are empty in " cite$ * warning$ } + 'skip$ + if$ + } + FUNCTION {format.thesis.type} + { type duplicate$ empty$ + 'pop$ + { swap$ pop$ + "t" change.case$ "type" bibinfo.check + } + if$ +} +FUNCTION {format.tr.number} +{ + number "number" bibinfo.check + %%type duplicate$ empty$ + %%{ pop$ bbl.techrep } + %%'skip$ + %%if$ + %%"type" bibinfo.check + %%swap$ duplicate$ empty$ + %%{ pop$ "t" change.case$ } + %%{ tie.or.space.prefix * * } + %%if$ +} + +FUNCTION {format.org.or.pub} +{ 't := + "" + address empty$ t empty$ and + 'skip$ + { + address "address" bibinfo.check * + t empty$ + 'skip$ + { address empty$ + 'skip$ + { ": " * } + if$ + t * + } + if$ + } + if$ +} + +FUNCTION {format.publisher.address} +{ publisher "publisher" bibinfo.warn format.org.or.pub +} + +FUNCTION {format.organization.address} +{ organization "organization" bibinfo.check format.org.or.pub +} + +FUNCTION {format.institution.address} +{ institution "institution" bibinfo.check format.org.or.pub +} + + +% urlbst... +% Functions for making hypertext links. +% In all cases, the stack has (link-text href-url) +% +% make 'null' specials +FUNCTION {make.href.null} +{ + pop$ +} +% make hypertex specials +FUNCTION {make.href.hypertex} +{ + "\special {html: }" * swap$ * + "\special {html:}" * +} +% make hyperref specials +FUNCTION {make.href.hyperref} +{ + "\href {" swap$ * "} {" * swap$ * "}" * +} +FUNCTION {make.href} +{ hrefform #2 = + 'make.href.hyperref % hrefform = 2 + { hrefform #1 = + 'make.href.hypertex % hrefform = 1 + 'make.href.null % hrefform = 0 (or anything else) + if$ + } + if$ +} + +FUNCTION {format.url} +{ url empty$ + { "" } + { hrefform #1 = + { % special case -- add HyperTeX specials + urlintro "\url{" url * "}" * url make.href.hypertex * } + { urlintro "\url{" * url * "}" * } + if$ + } + if$ +} + +FUNCTION {format.eprint} +{ eprint empty$ + { "" } + { eprintprefix eprint * eprinturl eprint * make.href } + if$ +} + +FUNCTION {format.doi} +{ doi empty$ + { "" } + { doiprefix doi * doiurl doi * make.href } + if$ +} + +FUNCTION {format.ddoi} +{ doi "doi" bibinfo.check + duplicate$ empty$ 'skip$ + { + "\doi{" swap$ * "}" * + } + if$ +} + +% Output a URL. We can't use the more normal idiom (something like +% `format.url output'), because the `inbrackets' within +% format.lastchecked applies to everything between calls to `output', +% so that `format.url format.lastchecked * output' ends up with both +% the URL and the lastchecked in brackets. +FUNCTION {output.url} +{ url empty$ + 'skip$ + { new.block + format.url output + format.lastchecked output + } + if$ +} + +FUNCTION {output.web.refs} +{ + new.block + output.url + addeprints eprint empty$ not and + { format.eprint output.nonnull } + 'skip$ + if$ + adddoiresolver doi empty$ not and + { format.doi output.nonnull } + 'skip$ + if$ +% addeprints +% { eprint empty$ +% 'skip$ +% { format.eprint output.nonnull } +% if$ +% } +% 'skip$ +% if$ +} + +% Webpage entry type. +% Title and url fields required; +% author, note, year, month, and lastchecked fields optional +STRINGS {database} +FUNCTION {webpage} +{ output.bibitem + author empty$ + { editor empty$ + 'skip$ % author and editor both optional + { format.editors output.nonnull } + if$ + } + { editor empty$ + { format.authors output.nonnull } + { "can't use both author and editor fields in " cite$ * warning$ } + if$ + } + if$ +% author empty$ +% 'skip$ +% { format.authors output.nonnull } +% if$ + new.block + format.title "title" output.check + journal empty$ + { + format.type "type" output.check + publisher empty$ + 'skip$ + { format.publisher.address output } + if$ + "database on the Internet" 'database := + type database = + { format.journal.date "year" output.check } + { format.date "year" output.check } + if$ + lastchecked empty$ + 'skip$ + { format.lastchecked output } + if$ + new.block + part empty$ + 'skip$ + { part output } + if$ + pages empty$ + 'skip$ + { pages bracket.check output } + if$ + } + { journal + remove.dots + "journal" bibinfo.check + "journal" output.check + format.type "type" output.check + format.journal.date "year" output.check + lastchecked empty$ + 'skip$ + { format.lastchecked output + ";" no.blank.or.punct output + } + if$ + no.blank.or.punct format.vol.num output + pages empty$ + 'skip$ + { ":" no.blank.or.punct output + no.blank.or.punct pages bracket.check output + } + if$ + new.block + } + if$ + format.url "url" output.check + new.block + note output + fin.entry +} +% ...urlbst to here + +FUNCTION {misc} +{ output.bibitem + format.authors "author" output.check + format.editors "author and editor" output.check + no.blank.or.punct + add.period$ misc.add.colon +format.title "title" output.check + type missing$ + { skip$ } + { format.type "type" output.check } + %%{ inbrackets type output } + if$ + new.block + format.publisher.address output +% format.date "year" output.check + new.block + format.note output + new.block + howpublished new.block.checka + howpublished "howpublished" bibinfo.check output + output.web.refs % urlbst + fin.entry + empty.misc.check +} + +FUNCTION {format.archive} +{ + archivePrefix empty$ + { "" } + { archivePrefix ":" *} + if$ +} + +FUNCTION {format.primaryClass} +{ + primaryClass empty$ + { "" } + { "{[" primaryClass * "]}" *} + if$ +} + +FUNCTION {format.soft.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://arxiv.org/abs/" eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {format.softmisc.archive} +{ + archivePrefix empty$ + { "" } + { "" } + if$ +} + +FUNCTION {format.softmisc.eprint} +{ eprint empty$ + { ""} + { archive empty$ + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + {"{\href{https://ascl.net/" format.softmisc.archive * eprint * "}" * + "{{" * format.archive * eprint * "}}}" *} + if$ + } + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + organization empty$ + 'skip$ + { author empty$ + { + format.organizations "organization" output.check + } + { + "; " * + no.blank.or.punct + format.organizations "organization" output.check + } + if$ + } + if$ + new.block + format.title "title" output.check + type missing$ + { skip$ } + { format.type "type" output.check } + if$ + new.block + journal + remove.dots + "journal" bibinfo.check + "journal" output.check + format.journal.date "year" output.check + add.semicolon + format.vol.num.pages output + new.block + format.note output + format.ddoi output + new.block + format.soft.eprint output + format.primaryClass output + fin.entry +} + +FUNCTION {softmisc} +{ output.bibitem + format.authors "author" output.check + format.editors "author and editor" output.check + no.blank.or.punct + add.period$ misc.add.colon + format.title "title" output.check misc.add.comma + no.blank.or.punct + version output + type missing$ + { skip$ } + { format.type "type" output.check } + %%{ inbrackets type output } + if$ + new.block + format.publisher.address output +% format.date "year" output.check + new.block + format.note output + new.block + howpublished new.block.checka + howpublished "howpublished" bibinfo.check output + format.date "year" output.check + output.web.refs % urlbst + new.block + format.softmisc.eprint output + fin.entry + empty.misc.check +} + +FUNCTION {book} +{ output.bibitem + author empty$ + { editor empty$ + { format.organizations "organization" output.check } + { format.editors "author and editor" output.check } + if$ + } + { format.authors output.nonnull + "author and editor" editor either.or.check + } + if$ + new.block + format.btitle "title" output.check + format.bvolume output + new.block + format.edition output + new.sentence + author empty$ not + editor empty$ not + and + { format.editors "author and editor" output.check } + 'skip$ + if$ + format.number.series output + format.publisher.address output + format.date "year" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {booklet} +{ misc } + +FUNCTION {dictionary} +{ output.bibitem + format.booktitle "booktitle" output.check + format.bvolume output + new.block + format.edition output + new.sentence + format.publisher.address output + format.date "year" output.check + format.btitle "title" output.check + add.semicolon + add.blank + format.pages "pages" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + format.authors "author" output.check + new.block + chapter "chapter" output.check + new.block + format.in.ed.title "title" output.check + format.bvolume output + format.edition output + new.sentence + format.number.series output + format.publisher.address output + format.date "year" output.check + date.block + add.blank + format.pages "pages" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + new.block + format.title "title" output.check + new.block + format.in.ed.booktitle "booktitle" output.check + format.bvolume output + format.edition output + new.sentence + format.number.series output + format.publisher.address output + format.date "year" output.check + date.block + add.blank + format.pages "pages" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + new.block + format.title "title" output.check + new.block + format.in.ed.booktitle "booktitle" output.check + format.bvolume output + new.sentence + format.number.series output + publisher empty$ + { format.organization.address output } + { organization "organization" bibinfo.check output + format.publisher.address output + } + if$ + format.date "year" output.check + date.block + add.blank + format.pages "pages" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {conference} +{inproceedings} + +FUNCTION {manual} +{misc} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + new.block + format.btitle + "title" output.check + format.type "type" output.check + new.block + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.date "year" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {mastersthesis} +{phdthesis} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization "organization" bibinfo.check output + } + { format.editors output.nonnull } + if$ + new.block + format.btitle "title" output.check + format.bvolume output + editor empty$ + { publisher empty$ + 'skip$ + { + new.sentence + format.number.series output + format.publisher.address output + } + if$ + } + { publisher empty$ + { + new.sentence + format.organization.address output } + { + new.sentence + organization "organization" bibinfo.check output + format.publisher.address output + } + if$ + } + if$ + format.date "year" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + new.block + format.title + "title" output.check + new.block + format.institution.address output + format.date "year" output.check + format.tr.number output.nonnull + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {map} +{ output.bibitem + format.cartographers "cartographer" output.check + new.block + format.title + "title" output.check + format.type "type" output.check + new.block + format.publisher.address output + format.date "year" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {patent} +{ output.bibitem + format.inventors "inventor" output.check + "; " * + no.blank.or.punct + format.assignees "assignee" output.check + new.block + format.title + "title" output.check + new.block + format.tr.number output.nonnull + format.date "year" output.check + new.block + format.note output + output.web.refs % urlbst + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + new.block + format.title "title" output.check + format.date output + new.block + format.note "note" output.check + output.web.refs % urlbst + fin.entry +} + +FUNCTION {default.type} { misc } +READ +STRINGS { longest.label } +INTEGERS { number.label longest.label.width } +FUNCTION {initialize.longest.label} +{ "" 'longest.label := + #1 'number.label := + #0 'longest.label.width := +} +FUNCTION {longest.label.pass} +{ number.label int.to.str$ 'label := + number.label #1 + 'number.label := + label width$ longest.label.width > + { label 'longest.label := + label width$ 'longest.label.width := + } + 'skip$ + if$ +} +EXECUTE {initialize.longest.label} +ITERATE {longest.label.pass} +FUNCTION {begin.bib} +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + "\begin{thebibliography}{" longest.label * "}" * + write$ newline$ + "\providecommand{\doi}[1]{\url{https://doi.org/#1}}" + write$ newline$ + "\bibcommenthead" write$ newline$ +} +EXECUTE {begin.bib} +EXECUTE {init.config.constants} +EXECUTE {init.state.consts} +ITERATE {call.type$} +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} +EXECUTE {end.bib} +%% End of customized bst file +%% +%% End of file `vancouver.bst'. + diff --git a/inst/rmarkdown/templates/springer/skeleton/svglov3.clo b/inst/rmarkdown/templates/springer/skeleton/svglov3.clo deleted file mode 100644 index b0f18d45d..000000000 --- a/inst/rmarkdown/templates/springer/skeleton/svglov3.clo +++ /dev/null @@ -1,113 +0,0 @@ -% SVJour3 DOCUMENT CLASS OPTION SVGLOV3 -- for standardised journals -% -% This is an enhancement for the LaTeX -% SVJour3 document class for Springer journals -% -%% -%% -%% \CharacterTable -%% {Upper-case \A\B\C\D\E\F\G\H\I\J\K\L\M\N\O\P\Q\R\S\T\U\V\W\X\Y\Z -%% Lower-case \a\b\c\d\e\f\g\h\i\j\k\l\m\n\o\p\q\r\s\t\u\v\w\x\y\z -%% Digits \0\1\2\3\4\5\6\7\8\9 -%% Exclamation \! Double quote \" Hash (number) \# -%% Dollar \$ Percent \% Ampersand \& -%% Acute accent \' Left paren \( Right paren \) -%% Asterisk \* Plus \+ Comma \, -%% Minus \- Point \. Solidus \/ -%% Colon \: Semicolon \; Less than \< -%% Equals \= Greater than \> Question mark \? -%% Commercial at \@ Left bracket \[ Backslash \\ -%% Right bracket \] Circumflex \^ Underscore \_ -%% Grave accent \` Left brace \{ Vertical bar \| -%% Right brace \} Tilde \~} -\ProvidesFile{svglov3.clo} - [2009/12/18 v3.2 - style option for standardised journals] -\typeout{SVJour Class option: svglov3.clo for standardised journals} -\def\validfor{svjour3} -\global\let\if@runhead\iftrue -\ExecuteOptions{final,10pt} -% No size changing allowed, hence a "copy" of size10.clo is included -\DeclareFontShape{OT1}{cmr}{m}{n}{ - <-6> cmr5 - <6-7> cmr6 - <7-8> cmr7 - <8-9> cmr8 - <9-10> cmr9 - <10-12> cmr10 - <12-17> cmr12 - <17-> cmr17 - }{} -% -\renewcommand\normalsize{% -\if@twocolumn - \@setfontsize\normalsize\@xpt{12.5pt}% -\else - \if@smallext - \@setfontsize\normalsize\@xpt\@xiipt - \else - \@setfontsize\normalsize{9.5pt}{11.5pt}% - \fi -\fi - \abovedisplayskip=3 mm plus6pt minus 4pt - \belowdisplayskip=3 mm plus6pt minus 4pt - \abovedisplayshortskip=0.0 mm plus6pt - \belowdisplayshortskip=2 mm plus4pt minus 4pt - \let\@listi\@listI} -\normalsize -\newcommand\small{% -\if@twocolumn - \@setfontsize\small{8.5pt}\@xpt -\else - \if@smallext - \@setfontsize\small\@viiipt{9.5pt}% - \else - \@setfontsize\small\@viiipt{9.25pt}% - \fi -\fi - \abovedisplayskip 8.5\p@ \@plus3\p@ \@minus4\p@ - \abovedisplayshortskip \z@ \@plus2\p@ - \belowdisplayshortskip 4\p@ \@plus2\p@ \@minus2\p@ - \def\@listi{\leftmargin\leftmargini - \parsep 0\p@ \@plus1\p@ \@minus\p@ - \topsep 4\p@ \@plus2\p@ \@minus4\p@ - \itemsep0\p@}% - \belowdisplayskip \abovedisplayskip -} -\let\footnotesize\small -\newcommand\scriptsize{\@setfontsize\scriptsize\@viipt\@viiipt} -\newcommand\tiny{\@setfontsize\tiny\@vpt\@vipt} -\if@twocolumn - \newcommand\large{\@setfontsize\large\@xiipt\@xivpt} - \newcommand\LARGE{\@setfontsize\LARGE{16pt}{18pt}} -\else - \newcommand\large{\@setfontsize\large\@xipt\@xiipt} - \newcommand\LARGE{\@setfontsize\LARGE{13pt}{15pt}} -\fi -\newcommand\Large{\@setfontsize\Large\@xivpt{16dd}} -\newcommand\huge{\@setfontsize\huge\@xxpt{25}} -\newcommand\Huge{\@setfontsize\Huge\@xxvpt{30}} -% -\def\runheadhook{\rlap{\smash{\lower6.5pt\hbox to\textwidth{\hrulefill}}}} -\if@twocolumn -\setlength{\textwidth}{17.4cm} -\setlength{\textheight}{234mm} -\AtEndOfClass{\setlength\columnsep{6mm}} -\else - \if@smallext - \setlength{\textwidth}{11.9cm} - \setlength{\textheight}{19.4cm} - \else - \setlength{\textwidth}{12.2cm} - \setlength{\textheight}{19.8cm} - \fi -\fi -% -\AtBeginDocument{% -\@ifundefined{@journalname} - {\typeout{Unknown journal: specify \string\journalname\string{% -\string} in preambel^^J}}{}} -% -\endinput -%% -%% End of file `svglov3.clo'. diff --git a/inst/rmarkdown/templates/springer/skeleton/svjour3.cls b/inst/rmarkdown/templates/springer/skeleton/svjour3.cls deleted file mode 100644 index ae6cc67cc..000000000 --- a/inst/rmarkdown/templates/springer/skeleton/svjour3.cls +++ /dev/null @@ -1,1431 +0,0 @@ -% SVJour3 DOCUMENT CLASS -- version 3.2 for LaTeX2e -% -% LaTeX document class for Springer journals -% -%% -%% -%% \CharacterTable -%% {Upper-case \A\B\C\D\E\F\G\H\I\J\K\L\M\N\O\P\Q\R\S\T\U\V\W\X\Y\Z -%% Lower-case \a\b\c\d\e\f\g\h\i\j\k\l\m\n\o\p\q\r\s\t\u\v\w\x\y\z -%% Digits \0\1\2\3\4\5\6\7\8\9 -%% Exclamation \! Double quote \" Hash (number) \# -%% Dollar \$ Percent \% Ampersand \& -%% Acute accent \' Left paren \( Right paren \) -%% Asterisk \* Plus \+ Comma \, -%% Minus \- Point \. Solidus \/ -%% Colon \: Semicolon \; Less than \< -%% Equals \= Greater than \> Question mark \? -%% Commercial at \@ Left bracket \[ Backslash \\ -%% Right bracket \] Circumflex \^ Underscore \_ -%% Grave accent \` Left brace \{ Vertical bar \| -%% Right brace \} Tilde \~} -\NeedsTeXFormat{LaTeX2e}[1995/12/01] -\ProvidesClass{svjour3}[2007/05/08 v3.2 -^^JLaTeX document class for Springer journals] -\newcommand\@ptsize{} -\newif\if@restonecol -\newif\if@titlepage -\@titlepagefalse -\DeclareOption{a4paper} - {\setlength\paperheight {297mm}% - \setlength\paperwidth {210mm}} -\DeclareOption{10pt}{\renewcommand\@ptsize{0}} -\DeclareOption{twoside}{\@twosidetrue \@mparswitchtrue} -\DeclareOption{draft}{\setlength\overfullrule{5pt}} -\DeclareOption{final}{\setlength\overfullrule{0pt}} -\DeclareOption{fleqn}{\input{fleqn.clo}\AtBeginDocument{\mathindent\z@}% -\AtBeginDocument{\@ifpackageloaded{amsmath}{\@mathmargin\z@}{}}% -\PassOptionsToPackage{fleqn}{amsmath}} -%%% -\DeclareOption{onecolumn}{} -\DeclareOption{smallcondensed}{} -\DeclareOption{twocolumn}{\@twocolumntrue\ExecuteOptions{fleqn}} -\newif\if@smallext\@smallextfalse -\DeclareOption{smallextended}{\@smallexttrue} -\let\if@mathematic\iftrue -\let\if@numbook\iffalse -\DeclareOption{numbook}{\let\if@envcntsect\iftrue - \AtEndOfPackage{% - \renewcommand\thefigure{\thesection.\@arabic\c@figure}% - \renewcommand\thetable{\thesection.\@arabic\c@table}% - \renewcommand\theequation{\thesection.\@arabic\c@equation}% - \@addtoreset{figure}{section}% - \@addtoreset{table}{section}% - \@addtoreset{equation}{section}% - }% -} -\DeclareOption{openbib}{% - \AtEndOfPackage{% - \renewcommand\@openbib@code{% - \advance\leftmargin\bibindent - \itemindent -\bibindent - \listparindent \itemindent - \parsep \z@ - }% - \renewcommand\newblock{\par}}% -} -\DeclareOption{natbib}{% -\AtEndOfClass{\RequirePackage{natbib}% -% Changing some parameters of NATBIB -\setlength{\bibhang}{\parindent}% -%\setlength{\bibsep}{0mm}% -\let\bibfont=\small -\def\@biblabel#1{#1.}% -\newcommand{\etal}{et al.}% -\bibpunct{(}{)}{;}{a}{}{,}}} -% -\let\if@runhead\iffalse -\DeclareOption{runningheads}{\let\if@runhead\iftrue} -\let\if@smartrunh\iffalse -\DeclareOption{smartrunhead}{\let\if@smartrunh\iftrue} -\DeclareOption{nosmartrunhead}{\let\if@smartrunh\iffalse} -\let\if@envcntreset\iffalse -\DeclareOption{envcountreset}{\let\if@envcntreset\iftrue} -\let\if@envcntsame\iffalse -\DeclareOption{envcountsame}{\let\if@envcntsame\iftrue} -\let\if@envcntsect\iffalse -\DeclareOption{envcountsect}{\let\if@envcntsect\iftrue} -\let\if@referee\iffalse -\DeclareOption{referee}{\let\if@referee\iftrue} -\def\makereferee{\def\baselinestretch{2}} -\let\if@instindent\iffalse -\DeclareOption{instindent}{\let\if@instindent\iftrue} -\let\if@smartand\iffalse -\DeclareOption{smartand}{\let\if@smartand\iftrue} -\let\if@spthms\iftrue -\DeclareOption{nospthms}{\let\if@spthms\iffalse} -% -% language and babel dependencies -\DeclareOption{deutsch}{\def\switcht@@therlang{\switcht@deutsch}% -\gdef\svlanginfo{\typeout{Man spricht deutsch.}\global\let\svlanginfo\relax}} -\DeclareOption{francais}{\def\switcht@@therlang{\switcht@francais}% -\gdef\svlanginfo{\typeout{On parle francais.}\global\let\svlanginfo\relax}} -\let\switcht@@therlang\relax -\let\svlanginfo\relax -% -\AtBeginDocument{\@ifpackageloaded{babel}{% -\@ifundefined{extrasenglish}{}{\addto\extrasenglish{\switcht@albion}}% -\@ifundefined{extrasUKenglish}{}{\addto\extrasUKenglish{\switcht@albion}}% -\@ifundefined{extrasfrenchb}{}{\addto\extrasfrenchb{\switcht@francais}}% -\@ifundefined{extrasgerman}{}{\addto\extrasgerman{\switcht@deutsch}}% -\@ifundefined{extrasngerman}{}{\addto\extrasngerman{\switcht@deutsch}}% -}{\switcht@@therlang}% -} -% -\def\ClassInfoNoLine#1#2{% - \ClassInfo{#1}{#2\@gobble}% -} -\let\journalopt\@empty -\DeclareOption*{% -\InputIfFileExists{sv\CurrentOption.clo}{% -\global\let\journalopt\CurrentOption}{% -\ClassWarning{Springer-SVJour3}{Specified option or subpackage -"\CurrentOption" not found -}\OptionNotUsed}} -\ExecuteOptions{a4paper,twoside,10pt,instindent} -\ProcessOptions -% -\ifx\journalopt\@empty\relax -\ClassInfoNoLine{Springer-SVJour3}{extra/valid Springer sub-package (-> *.clo) -\MessageBreak not found in option list of \string\documentclass -\MessageBreak - autoactivating "global" style}{} -\input{svglov3.clo} -\else -\@ifundefined{validfor}{% -\ClassError{Springer-SVJour3}{Possible option clash for sub-package -\MessageBreak "sv\journalopt.clo" - option file not valid -\MessageBreak for this class}{Perhaps you used an option of the old -Springer class SVJour!} -}{} -\fi -% -\if@smartrunh\AtEndDocument{\islastpageeven\getlastpagenumber}\fi -% -\newcommand{\twocoltest}[2]{\if@twocolumn\def\@gtempa{#2}\else\def\@gtempa{#1}\fi -\@gtempa\makeatother} -\newcommand{\columncase}{\makeatletter\twocoltest} -% -\DeclareMathSymbol{\Gamma}{\mathalpha}{letters}{"00} -\DeclareMathSymbol{\Delta}{\mathalpha}{letters}{"01} -\DeclareMathSymbol{\Theta}{\mathalpha}{letters}{"02} -\DeclareMathSymbol{\Lambda}{\mathalpha}{letters}{"03} -\DeclareMathSymbol{\Xi}{\mathalpha}{letters}{"04} -\DeclareMathSymbol{\Pi}{\mathalpha}{letters}{"05} -\DeclareMathSymbol{\Sigma}{\mathalpha}{letters}{"06} -\DeclareMathSymbol{\Upsilon}{\mathalpha}{letters}{"07} -\DeclareMathSymbol{\Phi}{\mathalpha}{letters}{"08} -\DeclareMathSymbol{\Psi}{\mathalpha}{letters}{"09} -\DeclareMathSymbol{\Omega}{\mathalpha}{letters}{"0A} -% -\setlength\parindent{15\p@} -\setlength\smallskipamount{3\p@ \@plus 1\p@ \@minus 1\p@} -\setlength\medskipamount{6\p@ \@plus 2\p@ \@minus 2\p@} -\setlength\bigskipamount{12\p@ \@plus 4\p@ \@minus 4\p@} -\setlength\headheight{12\p@} -\setlength\headsep {14.50dd} -\setlength\topskip {10\p@} -\setlength\footskip{30\p@} -\setlength\maxdepth{.5\topskip} -% -\@settopoint\textwidth -\setlength\marginparsep {10\p@} -\setlength\marginparpush{5\p@} -\setlength\topmargin{-10pt} -\if@twocolumn - \setlength\oddsidemargin {-30\p@} - \setlength\evensidemargin{-30\p@} -\else - \setlength\oddsidemargin {\z@} - \setlength\evensidemargin{\z@} -\fi -\setlength\marginparwidth {48\p@} -\setlength\footnotesep{8\p@} -\setlength{\skip\footins}{9\p@ \@plus 4\p@ \@minus 2\p@} -\setlength\floatsep {12\p@ \@plus 2\p@ \@minus 2\p@} -\setlength\textfloatsep{20\p@ \@plus 2\p@ \@minus 4\p@} -\setlength\intextsep {20\p@ \@plus 2\p@ \@minus 2\p@} -\setlength\dblfloatsep {12\p@ \@plus 2\p@ \@minus 2\p@} -\setlength\dbltextfloatsep{20\p@ \@plus 2\p@ \@minus 4\p@} -\setlength\@fptop{0\p@} -\setlength\@fpsep{12\p@ \@plus 2\p@ \@minus 2\p@} -\setlength\@fpbot{0\p@ \@plus 1fil} -\setlength\@dblfptop{0\p@} -\setlength\@dblfpsep{12\p@ \@plus 2\p@ \@minus 2\p@} -\setlength\@dblfpbot{0\p@ \@plus 1fil} -\setlength\partopsep{2\p@ \@plus 1\p@ \@minus 1\p@} -\def\@listi{\leftmargin\leftmargini - \parsep \z@ - \topsep 6\p@ \@plus2\p@ \@minus4\p@ - \itemsep\parsep} -\let\@listI\@listi -\@listi -\def\@listii {\leftmargin\leftmarginii - \labelwidth\leftmarginii - \advance\labelwidth-\labelsep - \topsep \z@ - \parsep \topsep - \itemsep \parsep} -\def\@listiii{\leftmargin\leftmarginiii - \labelwidth\leftmarginiii - \advance\labelwidth-\labelsep - \topsep \z@ - \parsep \topsep - \itemsep \parsep} -\def\@listiv {\leftmargin\leftmarginiv - \labelwidth\leftmarginiv - \advance\labelwidth-\labelsep} -\def\@listv {\leftmargin\leftmarginv - \labelwidth\leftmarginv - \advance\labelwidth-\labelsep} -\def\@listvi {\leftmargin\leftmarginvi - \labelwidth\leftmarginvi - \advance\labelwidth-\labelsep} -% -\setlength\lineskip{1\p@} -\setlength\normallineskip{1\p@} -\renewcommand\baselinestretch{} -\setlength\parskip{0\p@ \@plus \p@} -\@lowpenalty 51 -\@medpenalty 151 -\@highpenalty 301 -\setcounter{topnumber}{4} -\renewcommand\topfraction{.9} -\setcounter{bottomnumber}{2} -\renewcommand\bottomfraction{.7} -\setcounter{totalnumber}{6} -\renewcommand\textfraction{.1} -\renewcommand\floatpagefraction{.85} -\setcounter{dbltopnumber}{3} -\renewcommand\dbltopfraction{.85} -\renewcommand\dblfloatpagefraction{.85} -\def\ps@headings{% - \let\@oddfoot\@empty\let\@evenfoot\@empty - \def\@evenhead{\small\csname runheadhook\endcsname - \rlap{\thepage}\hfil\leftmark\unskip}% - \def\@oddhead{\small\csname runheadhook\endcsname - \ignorespaces\rightmark\hfil\llap{\thepage}}% - \let\@mkboth\@gobbletwo - \let\sectionmark\@gobble - \let\subsectionmark\@gobble - } -% make indentations changeable -\def\setitemindent#1{\settowidth{\labelwidth}{#1}% - \leftmargini\labelwidth - \advance\leftmargini\labelsep - \def\@listi{\leftmargin\leftmargini - \labelwidth\leftmargini\advance\labelwidth by -\labelsep - \parsep=\parskip - \topsep=\medskipamount - \itemsep=\parskip \advance\itemsep by -\parsep}} -\def\setitemitemindent#1{\settowidth{\labelwidth}{#1}% - \leftmarginii\labelwidth - \advance\leftmarginii\labelsep -\def\@listii{\leftmargin\leftmarginii - \labelwidth\leftmarginii\advance\labelwidth by -\labelsep - \parsep=\parskip - \topsep=\z@ - \itemsep=\parskip \advance\itemsep by -\parsep}} -% labels of description -\def\descriptionlabel#1{\hspace\labelsep #1\hfil} -% adjusted environment "description" -% if an optional parameter (at the first two levels of lists) -% is present, its width is considered to be the widest mark -% throughout the current list. -\def\description{\@ifnextchar[{\@describe}{\list{}{\labelwidth\z@ - \itemindent-\leftmargin \let\makelabel\descriptionlabel}}} -\let\enddescription\endlist -% -\def\describelabel#1{#1\hfil} -\def\@describe[#1]{\relax\ifnum\@listdepth=0 -\setitemindent{#1}\else\ifnum\@listdepth=1 -\setitemitemindent{#1}\fi\fi -\list{--}{\let\makelabel\describelabel}} -% -\newdimen\logodepth -\logodepth=1.2cm -\newdimen\headerboxheight -\headerboxheight=163pt % 18 10.5dd-lines - 2\baselineskip -\if@twocolumn\else\advance\headerboxheight by-14.5mm\fi -\newdimen\betweenumberspace % dimension for space between -\betweenumberspace=3.33pt % number and text of titles. -\newdimen\aftertext % dimension for space after -\aftertext=5pt % text of title. -\newdimen\headlineindent % dimension for space between -\headlineindent=1.166cm % number and text of headings. -\if@mathematic - \def\runinend{} % \enspace} - \def\floatcounterend{\enspace} - \def\sectcounterend{} -\else - \def\runinend{.} - \def\floatcounterend{.\ } - \def\sectcounterend{.} -\fi -\def\email#1{\emailname: #1} -\def\keywords#1{\par\addvspace\medskipamount{\rightskip=0pt plus1cm -\def\and{\ifhmode\unskip\nobreak\fi\ $\cdot$ -}\noindent\keywordname\enspace\ignorespaces#1\par}} -% -\def\subclassname{{\bfseries Mathematics Subject Classification -(2000)}\enspace} -\def\subclass#1{\par\addvspace\medskipamount{\rightskip=0pt plus1cm -\def\and{\ifhmode\unskip\nobreak\fi\ $\cdot$ -}\noindent\subclassname\ignorespaces#1\par}} -% -\def\PACSname{\textbf{PACS}\enspace} -\def\PACS#1{\par\addvspace\medskipamount{\rightskip=0pt plus1cm -\def\and{\ifhmode\unskip\nobreak\fi\ $\cdot$ -}\noindent\PACSname\ignorespaces#1\par}} -% -\def\CRclassname{{\bfseries CR Subject Classification}\enspace} -\def\CRclass#1{\par\addvspace\medskipamount{\rightskip=0pt plus1cm -\def\and{\ifhmode\unskip\nobreak\fi\ $\cdot$ -}\noindent\CRclassname\ignorespaces#1\par}} -% -\def\ESMname{\textbf{Electronic Supplementary Material}\enspace} -\def\ESM#1{\par\addvspace\medskipamount -\noindent\ESMname\ignorespaces#1\par} -% -\newcounter{inst} -\newcounter{auth} -\def\authdepth{2} -\newdimen\instindent -\newbox\authrun -\newtoks\authorrunning -\newbox\titrun -\newtoks\titlerunning -\def\authorfont{\bfseries} - -\def\combirunning#1{\gdef\@combi{#1}} -\def\@combi{} -\newbox\combirun -% -\def\ps@last{\def\@evenhead{\small\rlap{\thepage}\hfil -\lastevenhead}} -\newcounter{lastpage} -\def\islastpageeven{\@ifundefined{lastpagenumber} -{\setcounter{lastpage}{0}}{\setcounter{lastpage}{\lastpagenumber}} -\ifnum\value{lastpage}>0 - \ifodd\value{lastpage}% - \else - \if@smartrunh - \thispagestyle{last}% - \fi - \fi -\fi} -\def\getlastpagenumber{\clearpage -\addtocounter{page}{-1}% - \immediate\write\@auxout{\string\gdef\string\lastpagenumber{\thepage}}% - \immediate\write\@auxout{\string\newlabel{LastPage}{{}{\thepage}}}% - \addtocounter{page}{1}} - -\def\journalname#1{\gdef\@journalname{#1}} - -\def\dedication#1{\gdef\@dedic{#1}} -\def\@dedic{} - -\let\@date\undefined -\def\notused{~} - -\def\institute#1{\gdef\@institute{#1}} - -\def\offprints#1{\begingroup -\def\protect{\noexpand\protect\noexpand}\xdef\@thanks{\@thanks -\protect\footnotetext[0]{\unskip\hskip-15pt{\itshape Send offprint requests -to\/}: \ignorespaces#1}}\endgroup\ignorespaces} - -%\def\mail#1{\gdef\@mail{#1}} -%\def\@mail{} - -\def\@thanks{} - -\def\@fnsymbol#1{\ifcase#1\or\star\or{\star\star}\or{\star\star\star}% - \or \dagger\or \ddagger\or - \mathchar "278\or \mathchar "27B\or \|\or **\or \dagger\dagger - \or \ddagger\ddagger \else\@ctrerr\fi\relax} -% -%\def\invthanks#1{\footnotetext[0]{\kern-\bibindent#1}} -% -\def\nothanksmarks{\def\thanks##1{\protected@xdef\@thanks{\@thanks - \protect\footnotetext[0]{\kern-\bibindent##1}}}} -% -\def\subtitle#1{\gdef\@subtitle{#1}} -\def\@subtitle{} - -\def\headnote#1{\gdef\@headnote{#1}} -\def\@headnote{} - -\def\papertype#1{\gdef\paper@type{\MakeUppercase{#1}}} -\def\paper@type{} - -\def\ch@ckobl#1#2{\@ifundefined{@#1} - {\typeout{SVJour3 warning: Missing -\expandafter\string\csname#1\endcsname}% - \csname #1\endcsname{#2}} - {}} -% -\def\ProcessRunnHead{% - \def\\{\unskip\ \ignorespaces}% - \def\thanks##1{\unskip{}}% - \instindent=\textwidth - \advance\instindent by-\headlineindent - \if!\the\titlerunning!\else - \edef\@title{\the\titlerunning}% - \fi - \global\setbox\titrun=\hbox{\small\rmfamily\unboldmath\ignorespaces\@title - \unskip}% - \ifdim\wd\titrun>\instindent - \typeout{^^JSVJour3 Warning: Title too long for running head.}% - \typeout{Please supply a shorter form with \string\titlerunning - \space prior to \string\maketitle}% - \global\setbox\titrun=\hbox{\small\rmfamily - Title Suppressed Due to Excessive Length}% - \fi - \xdef\@title{\copy\titrun}% -% - \if!\the\authorrunning! - \else - \setcounter{auth}{1}% - \edef\@author{\the\authorrunning}% - \fi - \ifnum\value{inst}>\authdepth - \def\stripauthor##1\and##2\endauthor{% - \protected@xdef\@author{##1\unskip\unskip\if!##2!\else\ et al.\fi}}% - \expandafter\stripauthor\@author\and\endauthor - \else - \gdef\and{\unskip, \ignorespaces}% - {\def\and{\noexpand\protect\noexpand\and}% - \protected@xdef\@author{\@author}} - \fi - \global\setbox\authrun=\hbox{\small\rmfamily\unboldmath\ignorespaces - \@author\unskip}% - \ifdim\wd\authrun>\instindent - \typeout{^^JSVJour3 Warning: Author name(s) too long for running head. - ^^JPlease supply a shorter form with \string\authorrunning - \space prior to \string\maketitle}% - \global\setbox\authrun=\hbox{\small\rmfamily Please give a shorter version - with: {\tt\string\authorrunning\space and - \string\titlerunning\space prior to \string\maketitle}}% - \fi - \xdef\@author{\copy\authrun}% - \markboth{\@author}{\@title}% -} -% -\let\orithanks=\thanks -\def\thanks#1{\ClassWarning{SVJour3}{\string\thanks\space may only be -used inside of \string\title, \string\author,\MessageBreak -and \string\date\space prior to \string\maketitle}} -% -\def\maketitle{\par\let\thanks=\orithanks -\ch@ckobl{journalname}{Noname} -\ch@ckobl{date}{the date of receipt and acceptance should be inserted -later} -\ch@ckobl{title}{A title should be given} -\ch@ckobl{author}{Name(s) and initial(s) of author(s) should be given} -\ch@ckobl{institute}{Address(es) of author(s) should be given} -\begingroup -% - \renewcommand\thefootnote{\@fnsymbol\c@footnote}% - \def\@makefnmark{$^{\@thefnmark}$}% - \renewcommand\@makefntext[1]{% - \noindent - \hb@xt@\bibindent{\hss\@makefnmark\enspace}##1\vrule height0pt - width0pt depth8pt} -% - \def\lastand{\ifnum\value{inst}=2\relax - \unskip{} \andname\ - \else - \unskip, \andname\ - \fi}% - \def\and{\stepcounter{auth}\relax - \if@smartand - \ifnum\value{auth}=\value{inst}% - \lastand - \else - \unskip, - \fi - \else - \unskip, - \fi}% - \thispagestyle{empty} - \ifnum \col@number=\@ne - \@maketitle - \else - \twocolumn[\@maketitle]% - \fi -% - \global\@topnum\z@ - \if!\@thanks!\else - \@thanks -\insert\footins{\vskip-3pt\hrule\@width\if@twocolumn\columnwidth -\else 38mm\fi\vskip3pt}% - \fi - {\def\thanks##1{\unskip{}}% - \def\iand{\\[5pt]\let\and=\nand}% - \def\nand{\ifhmode\unskip\nobreak\fi\ $\cdot$ }% - \let\and=\nand - \def\at{\\\let\and=\iand}% - \footnotetext[0]{\kern-\bibindent - \ignorespaces\@institute}\vspace{5dd}}% -%\if!\@mail!\else -% \footnotetext[0]{\kern-\bibindent\mailname\ -% \ignorespaces\@mail}% -%\fi -% - \if@runhead - \ProcessRunnHead - \fi -% - \endgroup - \setcounter{footnote}{0} - \global\let\thanks\relax - \global\let\maketitle\relax - \global\let\@maketitle\relax - \global\let\@thanks\@empty - \global\let\@author\@empty - \global\let\@date\@empty - \global\let\@title\@empty - \global\let\@subtitle\@empty - \global\let\title\relax - \global\let\author\relax - \global\let\date\relax - \global\let\and\relax} - -\def\makeheadbox{{% -\hbox to0pt{\vbox{\baselineskip=10dd\hrule\hbox -to\hsize{\vrule\kern3pt\vbox{\kern3pt -\hbox{\bfseries\@journalname\ manuscript No.} -\hbox{(will be inserted by the editor)} -\kern3pt}\hfil\kern3pt\vrule}\hrule}% -\hss}}} -% -\def\rubric{\setbox0=\hbox{\small\strut}\@tempdima=\ht0\advance -\@tempdima\dp0\advance\@tempdima2\fboxsep\vrule\@height\@tempdima -\@width\z@} -\newdimen\rubricwidth -% -\def\@maketitle{\newpage -\normalfont -\vbox to0pt{\if@twocolumn\vskip-39pt\else\vskip-49pt\fi -\nointerlineskip -\makeheadbox\vss}\nointerlineskip -\vbox to 0pt{\offinterlineskip\rubricwidth=\columnwidth -%%%%\vskip-12.5pt % -12.5pt -\if@twocolumn\else % one column journal - \divide\rubricwidth by144\multiply\rubricwidth by89 % perform golden section - \vskip-\topskip -\fi -\hrule\@height0.35mm\noindent -\advance\fboxsep by.25mm -\global\advance\rubricwidth by0pt -\rubric -\vss}\vskip19.5pt % war 9pt -% -\if@twocolumn\else - \gdef\footnoterule{% - \kern-3\p@ - \hrule\@width38mm % \columnwidth \rubricwidth - \kern2.6\p@} -\fi -% - \setbox\authrun=\vbox\bgroup - \if@twocolumn - \hrule\@height10.5mm\@width0\p@ - \else - \hrule\@height 2mm\@width0\p@ - \fi - \pretolerance=10000 - \rightskip=0pt plus 4cm - \nothanksmarks -% \if!\@headnote!\else -% \noindent -% {\LARGE\normalfont\itshape\ignorespaces\@headnote\par}\vskip 3.5mm -% \fi - {\LARGE\bfseries - \noindent\ignorespaces - \@title \par}\vskip 17pt\relax - \if!\@subtitle!\else - {\large\bfseries - \pretolerance=10000 - \rightskip=0pt plus 3cm - \vskip-12pt -% \noindent\ignorespaces\@subtitle \par}\vskip 11.24pt\relax - \noindent\ignorespaces\@subtitle \par}\vskip 17pt\relax - \fi - {\authorfont - \setbox0=\vbox{\setcounter{auth}{1}\def\and{\stepcounter{auth} }% - \hfuzz=2\textwidth\def\thanks##1{}\@author}% - \setcounter{footnote}{0}% - \global\value{inst}=\value{auth}% - \setcounter{auth}{1}% - \if@twocolumn - \rightskip43mm plus 4cm minus 3mm - \else % one column journal - \rightskip=\linewidth - \advance\rightskip by-\rubricwidth - \advance\rightskip by0pt plus 4cm minus 3mm - \fi -% -\def\and{\unskip\nobreak\enskip{\boldmath$\cdot$}\enskip\ignorespaces}% - \noindent\ignorespaces\@author\vskip7.23pt} -% - \small - \if!\@dedic!\else - \par - \normalsize\it - \addvspace\baselineskip - \noindent\@dedic - \fi - \egroup % end of header box - \@tempdima=\headerboxheight - \advance\@tempdima by-\ht\authrun - \unvbox\authrun - \ifdim\@tempdima>0pt - \vrule width0pt height\@tempdima\par - \fi - \noindent{\small\@date\if@twocolumn\vskip 7.2mm\else\vskip 5.2mm\fi} - \global\@minipagetrue - \global\everypar{\global\@minipagefalse\global\everypar{}}% -%\vskip22.47pt -} -% -\if@mathematic - \def\vec#1{\ensuremath{\mathchoice - {\mbox{\boldmath$\displaystyle\mathbf{#1}$}} - {\mbox{\boldmath$\textstyle\mathbf{#1}$}} - {\mbox{\boldmath$\scriptstyle\mathbf{#1}$}} - {\mbox{\boldmath$\scriptscriptstyle\mathbf{#1}$}}}} -\else - \def\vec#1{\ensuremath{\mathchoice - {\mbox{\boldmath$\displaystyle#1$}} - {\mbox{\boldmath$\textstyle#1$}} - {\mbox{\boldmath$\scriptstyle#1$}} - {\mbox{\boldmath$\scriptscriptstyle#1$}}}} -\fi -% -\def\tens#1{\ensuremath{\mathsf{#1}}} -% -\setcounter{secnumdepth}{3} -\newcounter {section} -\newcounter {subsection}[section] -\newcounter {subsubsection}[subsection] -\newcounter {paragraph}[subsubsection] -\newcounter {subparagraph}[paragraph] -\renewcommand\thesection {\@arabic\c@section} -\renewcommand\thesubsection {\thesection.\@arabic\c@subsection} -\renewcommand\thesubsubsection{\thesubsection.\@arabic\c@subsubsection} -\renewcommand\theparagraph {\thesubsubsection.\@arabic\c@paragraph} -\renewcommand\thesubparagraph {\theparagraph.\@arabic\c@subparagraph} -% -\def\@hangfrom#1{\setbox\@tempboxa\hbox{#1}% - \hangindent \z@\noindent\box\@tempboxa} -% -\def\@seccntformat#1{\csname the#1\endcsname\sectcounterend -\hskip\betweenumberspace} -% -% \newif\if@sectrule -% \if@twocolumn\else\let\@sectruletrue=\relax\fi -% \if@avier\let\@sectruletrue=\relax\fi -% \def\makesectrule{\if@sectrule\global\@sectrulefalse\null\vglue-\topskip -% \hrule\nobreak\parskip=5pt\relax\fi} -% % -% \let\makesectruleori=\makesectrule -% \def\restoresectrule{\global\let\makesectrule=\makesectruleori\global\@sectrulefalse} -% \def\nosectrule{\let\makesectrule=\restoresectrule} -% -\def\@startsection#1#2#3#4#5#6{% - \if@noskipsec \leavevmode \fi - \par - \@tempskipa #4\relax - \@afterindenttrue - \ifdim \@tempskipa <\z@ - \@tempskipa -\@tempskipa \@afterindentfalse - \fi - \if@nobreak - \everypar{}% - \else - \addpenalty\@secpenalty\addvspace\@tempskipa - \fi -% \ifnum#2=1\relax\@sectruletrue\fi - \@ifstar - {\@ssect{#3}{#4}{#5}{#6}}% - {\@dblarg{\@sect{#1}{#2}{#3}{#4}{#5}{#6}}}} -% -\def\@sect#1#2#3#4#5#6[#7]#8{% - \ifnum #2>\c@secnumdepth - \let\@svsec\@empty - \else - \refstepcounter{#1}% - \protected@edef\@svsec{\@seccntformat{#1}\relax}% - \fi - \@tempskipa #5\relax - \ifdim \@tempskipa>\z@ - \begingroup - #6{% \makesectrule - \@hangfrom{\hskip #3\relax\@svsec}% - \raggedright - \hyphenpenalty \@M% - \interlinepenalty \@M #8\@@par}% - \endgroup - \csname #1mark\endcsname{#7}% - \addcontentsline{toc}{#1}{% - \ifnum #2>\c@secnumdepth \else - \protect\numberline{\csname the#1\endcsname\sectcounterend}% - \fi - #7}% - \else - \def\@svsechd{% - #6{\hskip #3\relax - \@svsec #8\/\hskip\aftertext}% - \csname #1mark\endcsname{#7}% - \addcontentsline{toc}{#1}{% - \ifnum #2>\c@secnumdepth \else - \protect\numberline{\csname the#1\endcsname}% - \fi - #7}}% - \fi - \@xsect{#5}} -% -\def\@ssect#1#2#3#4#5{% - \@tempskipa #3\relax - \ifdim \@tempskipa>\z@ - \begingroup - #4{% \makesectrule - \@hangfrom{\hskip #1}% - \interlinepenalty \@M #5\@@par}% - \endgroup - \else - \def\@svsechd{#4{\hskip #1\relax #5}}% - \fi - \@xsect{#3}} - -% -% measures and setting of sections -% -\def\section{\@startsection{section}{1}{\z@}% - {-21dd plus-8pt minus-4pt}{10.5dd} - {\normalsize\bfseries\boldmath}} -\def\subsection{\@startsection{subsection}{2}{\z@}% - {-21dd plus-8pt minus-4pt}{10.5dd} - {\normalsize\upshape}} -\def\subsubsection{\@startsection{subsubsection}{3}{\z@}% - {-13dd plus-8pt minus-4pt}{10.5dd} - {\normalsize\itshape}} -\def\paragraph{\@startsection{paragraph}{4}{\z@}% - {-13pt plus-8pt minus-4pt}{\z@}{\normalsize\itshape}} - -\setlength\leftmargini {\parindent} -\leftmargin \leftmargini -\setlength\leftmarginii {\parindent} -\setlength\leftmarginiii {1.87em} -\setlength\leftmarginiv {1.7em} -\setlength\leftmarginv {.5em} -\setlength\leftmarginvi {.5em} -\setlength \labelsep {.5em} -\setlength \labelwidth{\leftmargini} -\addtolength\labelwidth{-\labelsep} -\@beginparpenalty -\@lowpenalty -\@endparpenalty -\@lowpenalty -\@itempenalty -\@lowpenalty -\renewcommand\theenumi{\@arabic\c@enumi} -\renewcommand\theenumii{\@alph\c@enumii} -\renewcommand\theenumiii{\@roman\c@enumiii} -\renewcommand\theenumiv{\@Alph\c@enumiv} -\newcommand\labelenumi{\theenumi.} -\newcommand\labelenumii{(\theenumii)} -\newcommand\labelenumiii{\theenumiii.} -\newcommand\labelenumiv{\theenumiv.} -\renewcommand\p@enumii{\theenumi} -\renewcommand\p@enumiii{\theenumi(\theenumii)} -\renewcommand\p@enumiv{\p@enumiii\theenumiii} -\newcommand\labelitemi{\normalfont\bfseries --} -\newcommand\labelitemii{\normalfont\bfseries --} -\newcommand\labelitemiii{$\m@th\bullet$} -\newcommand\labelitemiv{$\m@th\cdot$} - -\if@spthms -% definition of the "\spnewtheorem" command. -% -% Usage: -% -% \spnewtheorem{env_nam}{caption}[within]{cap_font}{body_font} -% or \spnewtheorem{env_nam}[numbered_like]{caption}{cap_font}{body_font} -% or \spnewtheorem*{env_nam}{caption}{cap_font}{body_font} -% -% New is "cap_font" and "body_font". It stands for -% fontdefinition of the caption and the text itself. -% -% "\spnewtheorem*" gives a theorem without number. -% -% A defined spnewthoerem environment is used as described -% by Lamport. -% -%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% - -\def\@thmcountersep{} -\def\@thmcounterend{} -\newcommand\nocaption{\noexpand\@gobble} -\newdimen\spthmsep \spthmsep=5pt - -\def\spnewtheorem{\@ifstar{\@sthm}{\@Sthm}} - -% definition of \spnewtheorem with number - -\def\@spnthm#1#2{% - \@ifnextchar[{\@spxnthm{#1}{#2}}{\@spynthm{#1}{#2}}} -\def\@Sthm#1{\@ifnextchar[{\@spothm{#1}}{\@spnthm{#1}}} - -\def\@spxnthm#1#2[#3]#4#5{\expandafter\@ifdefinable\csname #1\endcsname - {\@definecounter{#1}\@addtoreset{#1}{#3}% - \expandafter\xdef\csname the#1\endcsname{\expandafter\noexpand - \csname the#3\endcsname \noexpand\@thmcountersep \@thmcounter{#1}}% - \expandafter\xdef\csname #1name\endcsname{#2}% - \global\@namedef{#1}{\@spthm{#1}{\csname #1name\endcsname}{#4}{#5}}% - \global\@namedef{end#1}{\@endtheorem}}} - -\def\@spynthm#1#2#3#4{\expandafter\@ifdefinable\csname #1\endcsname - {\@definecounter{#1}% - \expandafter\xdef\csname the#1\endcsname{\@thmcounter{#1}}% - \expandafter\xdef\csname #1name\endcsname{#2}% - \global\@namedef{#1}{\@spthm{#1}{\csname #1name\endcsname}{#3}{#4}}% - \global\@namedef{end#1}{\@endtheorem}}} - -\def\@spothm#1[#2]#3#4#5{% - \@ifundefined{c@#2}{\@latexerr{No theorem environment `#2' defined}\@eha}% - {\expandafter\@ifdefinable\csname #1\endcsname - {\global\@namedef{the#1}{\@nameuse{the#2}}% - \expandafter\xdef\csname #1name\endcsname{#3}% - \global\@namedef{#1}{\@spthm{#2}{\csname #1name\endcsname}{#4}{#5}}% - \global\@namedef{end#1}{\@endtheorem}}}} - -\def\@spthm#1#2#3#4{\topsep 7\p@ \@plus2\p@ \@minus4\p@ -\labelsep=\spthmsep\refstepcounter{#1}% -\@ifnextchar[{\@spythm{#1}{#2}{#3}{#4}}{\@spxthm{#1}{#2}{#3}{#4}}} - -\def\@spxthm#1#2#3#4{\@spbegintheorem{#2}{\csname the#1\endcsname}{#3}{#4}% - \ignorespaces} - -\def\@spythm#1#2#3#4[#5]{\@spopargbegintheorem{#2}{\csname - the#1\endcsname}{#5}{#3}{#4}\ignorespaces} - -\def\normalthmheadings{\def\@spbegintheorem##1##2##3##4{\trivlist\normalfont - \item[\hskip\labelsep{##3##1\ ##2\@thmcounterend}]##4} -\def\@spopargbegintheorem##1##2##3##4##5{\trivlist - \item[\hskip\labelsep{##4##1\ ##2}]{##4(##3)\@thmcounterend\ }##5}} -\normalthmheadings - -\def\reversethmheadings{\def\@spbegintheorem##1##2##3##4{\trivlist\normalfont - \item[\hskip\labelsep{##3##2\ ##1\@thmcounterend}]##4} -\def\@spopargbegintheorem##1##2##3##4##5{\trivlist - \item[\hskip\labelsep{##4##2\ ##1}]{##4(##3)\@thmcounterend\ }##5}} - -% definition of \spnewtheorem* without number - -\def\@sthm#1#2{\@Ynthm{#1}{#2}} - -\def\@Ynthm#1#2#3#4{\expandafter\@ifdefinable\csname #1\endcsname - {\global\@namedef{#1}{\@Thm{\csname #1name\endcsname}{#3}{#4}}% - \expandafter\xdef\csname #1name\endcsname{#2}% - \global\@namedef{end#1}{\@endtheorem}}} - -\def\@Thm#1#2#3{\topsep 7\p@ \@plus2\p@ \@minus4\p@ -\@ifnextchar[{\@Ythm{#1}{#2}{#3}}{\@Xthm{#1}{#2}{#3}}} - -\def\@Xthm#1#2#3{\@Begintheorem{#1}{#2}{#3}\ignorespaces} - -\def\@Ythm#1#2#3[#4]{\@Opargbegintheorem{#1} - {#4}{#2}{#3}\ignorespaces} - -\def\@Begintheorem#1#2#3{#3\trivlist - \item[\hskip\labelsep{#2#1\@thmcounterend}]} - -\def\@Opargbegintheorem#1#2#3#4{#4\trivlist - \item[\hskip\labelsep{#3#1}]{#3(#2)\@thmcounterend\ }} - -% initialize theorem environment - -\if@envcntsect - \def\@thmcountersep{.} - \spnewtheorem{theorem}{Theorem}[section]{\bfseries}{\itshape} -\else - \spnewtheorem{theorem}{Theorem}{\bfseries}{\itshape} - \if@envcntreset - \@addtoreset{theorem}{section} - \else - \@addtoreset{theorem}{chapter} - \fi -\fi - -%definition of divers theorem environments -\spnewtheorem*{claim}{Claim}{\itshape}{\rmfamily} -\spnewtheorem*{proof}{Proof}{\itshape}{\rmfamily} -\if@envcntsame % all environments like "Theorem" - using its counter - \def\spn@wtheorem#1#2#3#4{\@spothm{#1}[theorem]{#2}{#3}{#4}} -\else % all environments with their own counter - \if@envcntsect % show section counter - \def\spn@wtheorem#1#2#3#4{\@spxnthm{#1}{#2}[section]{#3}{#4}} - \else % not numbered with section - \if@envcntreset - \def\spn@wtheorem#1#2#3#4{\@spynthm{#1}{#2}{#3}{#4} - \@addtoreset{#1}{section}} - \else - \let\spn@wtheorem=\@spynthm - \fi - \fi -\fi -% -\let\spdefaulttheorem=\spn@wtheorem -% -\spn@wtheorem{case}{Case}{\itshape}{\rmfamily} -\spn@wtheorem{conjecture}{Conjecture}{\itshape}{\rmfamily} -\spn@wtheorem{corollary}{Corollary}{\bfseries}{\itshape} -\spn@wtheorem{definition}{Definition}{\bfseries}{\rmfamily} -\spn@wtheorem{example}{Example}{\itshape}{\rmfamily} -\spn@wtheorem{exercise}{Exercise}{\bfseries}{\rmfamily} -\spn@wtheorem{lemma}{Lemma}{\bfseries}{\itshape} -\spn@wtheorem{note}{Note}{\itshape}{\rmfamily} -\spn@wtheorem{problem}{Problem}{\bfseries}{\rmfamily} -\spn@wtheorem{property}{Property}{\itshape}{\rmfamily} -\spn@wtheorem{proposition}{Proposition}{\bfseries}{\itshape} -\spn@wtheorem{question}{Question}{\itshape}{\rmfamily} -\spn@wtheorem{solution}{Solution}{\bfseries}{\rmfamily} -\spn@wtheorem{remark}{Remark}{\itshape}{\rmfamily} -% -\newenvironment{theopargself} - {\def\@spopargbegintheorem##1##2##3##4##5{\trivlist - \item[\hskip\labelsep{##4##1\ ##2}]{##4##3\@thmcounterend\ }##5} - \def\@Opargbegintheorem##1##2##3##4{##4\trivlist - \item[\hskip\labelsep{##3##1}]{##3##2\@thmcounterend\ }}}{} -\newenvironment{theopargself*} - {\def\@spopargbegintheorem##1##2##3##4##5{\trivlist - \item[\hskip\labelsep{##4##1\ ##2}]{\hspace*{-\labelsep}##4##3\@thmcounterend}##5} - \def\@Opargbegintheorem##1##2##3##4{##4\trivlist - \item[\hskip\labelsep{##3##1}]{\hspace*{-\labelsep}##3##2\@thmcounterend}}}{} -% -\fi - -\def\@takefromreset#1#2{% - \def\@tempa{#1}% - \let\@tempd\@elt - \def\@elt##1{% - \def\@tempb{##1}% - \ifx\@tempa\@tempb\else - \@addtoreset{##1}{#2}% - \fi}% - \expandafter\expandafter\let\expandafter\@tempc\csname cl@#2\endcsname - \expandafter\def\csname cl@#2\endcsname{}% - \@tempc - \let\@elt\@tempd} - -\def\squareforqed{\hbox{\rlap{$\sqcap$}$\sqcup$}} -\def\qed{\ifmmode\else\unskip\quad\fi\squareforqed} -\def\smartqed{\def\qed{\ifmmode\squareforqed\else{\unskip\nobreak\hfil -\penalty50\hskip1em\null\nobreak\hfil\squareforqed -\parfillskip=0pt\finalhyphendemerits=0\endgraf}\fi}} - -% Define `abstract' environment -\def\abstract{\topsep=0pt\partopsep=0pt\parsep=0pt\itemsep=0pt\relax -\trivlist\item[\hskip\labelsep -{\bfseries\abstractname}]\if!\abstractname!\hskip-\labelsep\fi} -\if@twocolumn -% \if@avier -% \def\endabstract{\endtrivlist\addvspace{5mm}\strich} -% \def\strich{\hrule\vskip1ptplus12pt} -% \else - \def\endabstract{\endtrivlist\addvspace{3mm}} -% \fi -\else -\fi -% -\newenvironment{verse} - {\let\\\@centercr - \list{}{\itemsep \z@ - \itemindent -1.5em% - \listparindent\itemindent - \rightmargin \leftmargin - \advance\leftmargin 1.5em}% - \item\relax} - {\endlist} -\newenvironment{quotation} - {\list{}{\listparindent 1.5em% - \itemindent \listparindent - \rightmargin \leftmargin - \parsep \z@ \@plus\p@}% - \item\relax} - {\endlist} -\newenvironment{quote} - {\list{}{\rightmargin\leftmargin}% - \item\relax} - {\endlist} -\newcommand\appendix{\par\small - \setcounter{section}{0}% - \setcounter{subsection}{0}% - \renewcommand\thesection{\@Alph\c@section}} -\setlength\arraycolsep{1.5\p@} -\setlength\tabcolsep{6\p@} -\setlength\arrayrulewidth{.4\p@} -\setlength\doublerulesep{2\p@} -\setlength\tabbingsep{\labelsep} -\skip\@mpfootins = \skip\footins -\setlength\fboxsep{3\p@} -\setlength\fboxrule{.4\p@} -\renewcommand\theequation{\@arabic\c@equation} -\newcounter{figure} -\renewcommand\thefigure{\@arabic\c@figure} -\def\fps@figure{tbp} -\def\ftype@figure{1} -\def\ext@figure{lof} -\def\fnum@figure{\figurename~\thefigure} -\newenvironment{figure} - {\@float{figure}} - {\end@float} -\newenvironment{figure*} - {\@dblfloat{figure}} - {\end@dblfloat} -\newcounter{table} -\renewcommand\thetable{\@arabic\c@table} -\def\fps@table{tbp} -\def\ftype@table{2} -\def\ext@table{lot} -\def\fnum@table{\tablename~\thetable} -\newenvironment{table} - {\@float{table}} - {\end@float} -\newenvironment{table*} - {\@dblfloat{table}} - {\end@dblfloat} -% -\def \@floatboxreset {% - \reset@font - \small - \@setnobreak - \@setminipage -} -% -\newcommand{\tableheadseprule}{\noalign{\hrule height.375mm}} -% -\newlength\abovecaptionskip -\newlength\belowcaptionskip -\setlength\abovecaptionskip{10\p@} -\setlength\belowcaptionskip{0\p@} -\newcommand\leftlegendglue{} - -\def\fig@type{figure} - -\newdimen\figcapgap\figcapgap=3pt -\newdimen\tabcapgap\tabcapgap=5.5pt - -\@ifundefined{floatlegendstyle}{\def\floatlegendstyle{\bfseries}}{} - -\long\def\@caption#1[#2]#3{\par\addcontentsline{\csname - ext@#1\endcsname}{#1}{\protect\numberline{\csname - the#1\endcsname}{\ignorespaces #2}}\begingroup - \@parboxrestore - \@makecaption{\csname fnum@#1\endcsname}{\ignorespaces #3}\par - \endgroup} - -\def\capstrut{\vrule\@width\z@\@height\topskip} - -\@ifundefined{captionstyle}{\def\captionstyle{\normalfont\small}}{} - -\long\def\@makecaption#1#2{% - \captionstyle - \ifx\@captype\fig@type - \vskip\figcapgap - \fi - \setbox\@tempboxa\hbox{{\floatlegendstyle #1\floatcounterend}% - \capstrut #2}% - \ifdim \wd\@tempboxa >\hsize - {\floatlegendstyle #1\floatcounterend}\capstrut #2\par - \else - \hbox to\hsize{\leftlegendglue\unhbox\@tempboxa\hfil}% - \fi - \ifx\@captype\fig@type\else - \vskip\tabcapgap - \fi} - -\newdimen\figgap\figgap=1cc -\long\def\@makesidecaption#1#2{% - \parbox[b]{\@tempdimb}{\captionstyle{\floatlegendstyle - #1\floatcounterend}#2}} -\def\sidecaption#1\caption{% -\setbox\@tempboxa=\hbox{#1\unskip}% -\if@twocolumn - \ifdim\hsize<\textwidth\else - \ifdim\wd\@tempboxa<\columnwidth - \typeout{Double column float fits into single column - - ^^Jyou'd better switch the environment. }% - \fi - \fi -\fi -\@tempdimb=\hsize -\advance\@tempdimb by-\figgap -\advance\@tempdimb by-\wd\@tempboxa -\ifdim\@tempdimb<3cm - \typeout{\string\sidecaption: No sufficient room for the legend; - using normal \string\caption. }% - \unhbox\@tempboxa - \let\@capcommand=\@caption -\else - \let\@capcommand=\@sidecaption - \leavevmode - \unhbox\@tempboxa - \hfill -\fi -\refstepcounter\@captype -\@dblarg{\@capcommand\@captype}} - -\long\def\@sidecaption#1[#2]#3{\addcontentsline{\csname - ext@#1\endcsname}{#1}{\protect\numberline{\csname - the#1\endcsname}{\ignorespaces #2}}\begingroup - \@parboxrestore - \@makesidecaption{\csname fnum@#1\endcsname}{\ignorespaces #3}\par - \endgroup} - -% Define `acknowledgement' environment -\def\acknowledgement{\par\addvspace{17pt}\small\rmfamily -\trivlist\if!\ackname!\item[]\else -\item[\hskip\labelsep -{\bfseries\ackname}]\fi} -\def\endacknowledgement{\endtrivlist\addvspace{6pt}} -\newenvironment{acknowledgements}{\begin{acknowledgement}} -{\end{acknowledgement}} -% Define `noteadd' environment -\def\noteadd{\par\addvspace{17pt}\small\rmfamily -\trivlist\item[\hskip\labelsep -{\itshape\noteaddname}]} -\def\endnoteadd{\endtrivlist\addvspace{6pt}} - -\DeclareOldFontCommand{\rm}{\normalfont\rmfamily}{\mathrm} -\DeclareOldFontCommand{\sf}{\normalfont\sffamily}{\mathsf} -\DeclareOldFontCommand{\tt}{\normalfont\ttfamily}{\mathtt} -\DeclareOldFontCommand{\bf}{\normalfont\bfseries}{\mathbf} -\DeclareOldFontCommand{\it}{\normalfont\itshape}{\mathit} -\DeclareOldFontCommand{\sl}{\normalfont\slshape}{\@nomath\sl} -\DeclareOldFontCommand{\sc}{\normalfont\scshape}{\@nomath\sc} -\DeclareRobustCommand*\cal{\@fontswitch\relax\mathcal} -\DeclareRobustCommand*\mit{\@fontswitch\relax\mathnormal} -\newcommand\@pnumwidth{1.55em} -\newcommand\@tocrmarg{2.55em} -\newcommand\@dotsep{4.5} -\setcounter{tocdepth}{1} -\newcommand\tableofcontents{% - \section*{\contentsname}% - \@starttoc{toc}% - \addtocontents{toc}{\begingroup\protect\small}% - \AtEndDocument{\addtocontents{toc}{\endgroup}}% - } -\newcommand*\l@part[2]{% - \ifnum \c@tocdepth >-2\relax - \addpenalty\@secpenalty - \addvspace{2.25em \@plus\p@}% - \begingroup - \setlength\@tempdima{3em}% - \parindent \z@ \rightskip \@pnumwidth - \parfillskip -\@pnumwidth - {\leavevmode - \large \bfseries #1\hfil \hb@xt@\@pnumwidth{\hss #2}}\par - \nobreak - \if@compatibility - \global\@nobreaktrue - \everypar{\global\@nobreakfalse\everypar{}}% - \fi - \endgroup - \fi} -\newcommand*\l@section{\@dottedtocline{1}{0pt}{1.5em}} -\newcommand*\l@subsection{\@dottedtocline{2}{1.5em}{2.3em}} -\newcommand*\l@subsubsection{\@dottedtocline{3}{3.8em}{3.2em}} -\newcommand*\l@paragraph{\@dottedtocline{4}{7.0em}{4.1em}} -\newcommand*\l@subparagraph{\@dottedtocline{5}{10em}{5em}} -\newcommand\listoffigures{% - \section*{\listfigurename - \@mkboth{\listfigurename}% - {\listfigurename}}% - \@starttoc{lof}% - } -\newcommand*\l@figure{\@dottedtocline{1}{1.5em}{2.3em}} -\newcommand\listoftables{% - \section*{\listtablename - \@mkboth{\listtablename}{\listtablename}}% - \@starttoc{lot}% - } -\let\l@table\l@figure -\newdimen\bibindent -\setlength\bibindent{\parindent} -\def\@biblabel#1{#1.} -\def\@lbibitem[#1]#2{\item[{[#1]}\hfill]\if@filesw - {\let\protect\noexpand - \immediate - \write\@auxout{\string\bibcite{#2}{#1}}}\fi\ignorespaces} -\newenvironment{thebibliography}[1] - {\section*{\refname - \@mkboth{\refname}{\refname}}\small - \list{\@biblabel{\@arabic\c@enumiv}}% - {\settowidth\labelwidth{\@biblabel{#1}}% - \leftmargin\labelwidth - \advance\leftmargin\labelsep - \@openbib@code - \usecounter{enumiv}% - \let\p@enumiv\@empty - \renewcommand\theenumiv{\@arabic\c@enumiv}}% - \sloppy\clubpenalty4000\widowpenalty4000% - \sfcode`\.\@m} - {\def\@noitemerr - {\@latex@warning{Empty `thebibliography' environment}}% - \endlist} -% -\newcount\@tempcntc -\def\@citex[#1]#2{\if@filesw\immediate\write\@auxout{\string\citation{#2}}\fi - \@tempcnta\z@\@tempcntb\m@ne\def\@citea{}\@cite{\@for\@citeb:=#2\do - {\@ifundefined - {b@\@citeb}{\@citeo\@tempcntb\m@ne\@citea\def\@citea{,}{\bfseries - ?}\@warning - {Citation `\@citeb' on page \thepage \space undefined}}% - {\setbox\z@\hbox{\global\@tempcntc0\csname b@\@citeb\endcsname\relax}% - \ifnum\@tempcntc=\z@ \@citeo\@tempcntb\m@ne - \@citea\def\@citea{,\hskip0.1em\ignorespaces}\hbox{\csname b@\@citeb\endcsname}% - \else - \advance\@tempcntb\@ne - \ifnum\@tempcntb=\@tempcntc - \else\advance\@tempcntb\m@ne\@citeo - \@tempcnta\@tempcntc\@tempcntb\@tempcntc\fi\fi}}\@citeo}{#1}} -\def\@citeo{\ifnum\@tempcnta>\@tempcntb\else - \@citea\def\@citea{,\hskip0.1em\ignorespaces}% - \ifnum\@tempcnta=\@tempcntb\the\@tempcnta\else - {\advance\@tempcnta\@ne\ifnum\@tempcnta=\@tempcntb \else \def\@citea{--}\fi - \advance\@tempcnta\m@ne\the\@tempcnta\@citea\the\@tempcntb}\fi\fi} -% -\newcommand\newblock{\hskip .11em\@plus.33em\@minus.07em} -\let\@openbib@code\@empty -\newenvironment{theindex} - {\if@twocolumn - \@restonecolfalse - \else - \@restonecoltrue - \fi - \columnseprule \z@ - \columnsep 35\p@ - \twocolumn[\section*{\indexname}]% - \@mkboth{\indexname}{\indexname}% - \thispagestyle{plain}\parindent\z@ - \parskip\z@ \@plus .3\p@\relax - \let\item\@idxitem} - {\if@restonecol\onecolumn\else\clearpage\fi} -\newcommand\@idxitem{\par\hangindent 40\p@} -\newcommand\subitem{\@idxitem \hspace*{20\p@}} -\newcommand\subsubitem{\@idxitem \hspace*{30\p@}} -\newcommand\indexspace{\par \vskip 10\p@ \@plus5\p@ \@minus3\p@\relax} - -\if@twocolumn - \renewcommand\footnoterule{% - \kern-3\p@ - \hrule\@width\columnwidth - \kern2.6\p@} -\else - \renewcommand\footnoterule{% - \kern-3\p@ - \hrule\@width.382\columnwidth - \kern2.6\p@} -\fi -\newcommand\@makefntext[1]{% - \noindent - \hb@xt@\bibindent{\hss\@makefnmark\enspace}#1} -% -\def\trans@english{\switcht@albion} -\def\trans@french{\switcht@francais} -\def\trans@german{\switcht@deutsch} -\newenvironment{translation}[1]{\if!#1!\else -\@ifundefined{selectlanguage}{\csname trans@#1\endcsname}{\selectlanguage{#1}}% -\fi}{} -% languages -% English section -\def\switcht@albion{%\typeout{English spoken.}% - \def\abstractname{Abstract}% - \def\ackname{Acknowledgements}% - \def\andname{and}% - \def\lastandname{, and}% - \def\appendixname{Appendix}% - \def\chaptername{Chapter}% - \def\claimname{Claim}% - \def\conjecturename{Conjecture}% - \def\contentsname{Contents}% - \def\corollaryname{Corollary}% - \def\definitionname{Definition}% - \def\emailname{E-mail}% - \def\examplename{Example}% - \def\exercisename{Exercise}% - \def\figurename{Fig.}% - \def\keywordname{{\bfseries Keywords}}% - \def\indexname{Index}% - \def\lemmaname{Lemma}% - \def\contriblistname{List of Contributors}% - \def\listfigurename{List of Figures}% - \def\listtablename{List of Tables}% - \def\mailname{{\itshape Correspondence to\/}:}% - \def\noteaddname{Note added in proof}% - \def\notename{Note}% - \def\partname{Part}% - \def\problemname{Problem}% - \def\proofname{Proof}% - \def\propertyname{Property}% - \def\questionname{Question}% - \def\refname{References}% - \def\remarkname{Remark}% - \def\seename{see}% - \def\solutionname{Solution}% - \def\tablename{Table}% - \def\theoremname{Theorem}% -}\switcht@albion % make English default -% -% French section -\def\switcht@francais{\svlanginfo -%\typeout{On parle francais.}% - \def\abstractname{R\'esum\'e\runinend}% - \def\ackname{Remerciements\runinend}% - \def\andname{et}% - \def\lastandname{ et}% - \def\appendixname{Appendice}% - \def\chaptername{Chapitre}% - \def\claimname{Pr\'etention}% - \def\conjecturename{Hypoth\`ese}% - \def\contentsname{Table des mati\`eres}% - \def\corollaryname{Corollaire}% - \def\definitionname{D\'efinition}% - \def\emailname{E-mail}% - \def\examplename{Exemple}% - \def\exercisename{Exercice}% - \def\figurename{Fig.}% - \def\keywordname{{\bfseries Mots-cl\'e\runinend}}% - \def\indexname{Index}% - \def\lemmaname{Lemme}% - \def\contriblistname{Liste des contributeurs}% - \def\listfigurename{Liste des figures}% - \def\listtablename{Liste des tables}% - \def\mailname{{\itshape Correspondence to\/}:}% - \def\noteaddname{Note ajout\'ee \`a l'\'epreuve}% - \def\notename{Remarque}% - \def\partname{Partie}% - \def\problemname{Probl\`eme}% - \def\proofname{Preuve}% - \def\propertyname{Caract\'eristique}% -%\def\propositionname{Proposition}% - \def\questionname{Question}% - \def\refname{Bibliographie}% - \def\remarkname{Remarque}% - \def\seename{voyez}% - \def\solutionname{Solution}% -%\def\subclassname{{\it Subject Classifications\/}:}% - \def\tablename{Tableau}% - \def\theoremname{Th\'eor\`eme}% -} -% -% German section -\def\switcht@deutsch{\svlanginfo -%\typeout{Man spricht deutsch.}% - \def\abstractname{Zusammenfassung\runinend}% - \def\ackname{Danksagung\runinend}% - \def\andname{und}% - \def\lastandname{ und}% - \def\appendixname{Anhang}% - \def\chaptername{Kapitel}% - \def\claimname{Behauptung}% - \def\conjecturename{Hypothese}% - \def\contentsname{Inhaltsverzeichnis}% - \def\corollaryname{Korollar}% -%\def\definitionname{Definition}% - \def\emailname{E-Mail}% - \def\examplename{Beispiel}% - \def\exercisename{\"Ubung}% - \def\figurename{Abb.}% - \def\keywordname{{\bfseries Schl\"usselw\"orter\runinend}}% - \def\indexname{Index}% -%\def\lemmaname{Lemma}% - \def\contriblistname{Mitarbeiter}% - \def\listfigurename{Abbildungsverzeichnis}% - \def\listtablename{Tabellenverzeichnis}% - \def\mailname{{\itshape Correspondence to\/}:}% - \def\noteaddname{Nachtrag}% - \def\notename{Anmerkung}% - \def\partname{Teil}% -%\def\problemname{Problem}% - \def\proofname{Beweis}% - \def\propertyname{Eigenschaft}% -%\def\propositionname{Proposition}% - \def\questionname{Frage}% - \def\refname{Literatur}% - \def\remarkname{Anmerkung}% - \def\seename{siehe}% - \def\solutionname{L\"osung}% -%\def\subclassname{{\it Subject Classifications\/}:}% - \def\tablename{Tabelle}% -%\def\theoremname{Theorem}% -} -\newcommand\today{} -\edef\today{\ifcase\month\or - January\or February\or March\or April\or May\or June\or - July\or August\or September\or October\or November\or December\fi - \space\number\day, \number\year} -\setlength\columnsep{1.5cc} -\setlength\columnseprule{0\p@} -% -\frenchspacing -\clubpenalty=10000 -\widowpenalty=10000 -\def\thisbottomragged{\def\@textbottom{\vskip\z@ plus.0001fil -\global\let\@textbottom\relax}} -\pagestyle{headings} -\pagenumbering{arabic} -\if@twocolumn - \twocolumn -\fi -%\if@avier -% \onecolumn -% \setlength{\textwidth}{156mm} -% \setlength{\textheight}{226mm} -%\fi -\if@referee - \makereferee -\fi -\flushbottom -\endinput -%% -%% End of file `svjour3.cls'. diff --git a/man/article.Rd b/man/article.Rd index 21df48297..a3cfc2f6d 100644 --- a/man/article.Rd +++ b/man/article.Rd @@ -149,7 +149,14 @@ sage_article(..., highlight = NULL, citation_package = "natbib") sim_article(..., highlight = NULL, citation_package = "natbib") -springer_article(..., keep_tex = TRUE, citation_package = "default") +springer_article( + ..., + keep_tex = TRUE, + citation_package = "natbib", + number_sections = TRUE, + latex_engine = "pdflatex", + pandoc_args = NULL +) tf_article(..., keep_tex = TRUE, citation_package = "natbib") diff --git a/tests/testit/test-formats.R b/tests/testit/test-formats.R index a7d8c66ff..ad4769a1c 100644 --- a/tests/testit/test-formats.R +++ b/tests/testit/test-formats.R @@ -77,7 +77,7 @@ test_format("rsos") test_format("rss") test_format("sage") test_format("sim") -test_format("springer") +test_format("springer", skip = !rmarkdown::pandoc_available("2.11.4")) test_format("tf") test_format("trb") # Deactivate because of https://github.com/rstudio/rticles/issues/523