From 961e7fa8f3ee71a0841b61bbd2675c45643dbdd3 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 30 Nov 2024 23:13:55 +0100 Subject: [PATCH 01/29] Add support to all bibliography styles required by Taylor & Francis journals * R/article.R: Check whether the biblio-style field in the YAML header contains one of the allowed values * inst/rmarkdown/templates/tf/skeleton/interact.cls: Update to version v1.05 * inst/rmarkdown/templates/tf/resources/template.tex: Choose the bibliography-related code according to biblio-style * inst/rmarkdown/templates/tf/skeleton/tf{nlm,p,q,s}.bst: Add lacking bibliography style files from T&F * man/article.Rd: Document the changes --- R/article.R | 15 +- .../templates/tf/resources/template.tex | 48 +- .../templates/tf/skeleton/interact.cls | 379 +-- .../rmarkdown/templates/tf/skeleton/tfnlm.bst | 1778 ++++++++++++++ inst/rmarkdown/templates/tf/skeleton/tfp.bst | 1763 ++++++++++++++ inst/rmarkdown/templates/tf/skeleton/tfq.bst | 1963 +++++++++++++++ inst/rmarkdown/templates/tf/skeleton/tfs.bst | 2140 +++++++++++++++++ man/article.Rd | 2 +- 8 files changed, 7894 insertions(+), 194 deletions(-) create mode 100644 inst/rmarkdown/templates/tf/skeleton/tfnlm.bst create mode 100644 inst/rmarkdown/templates/tf/skeleton/tfp.bst create mode 100644 inst/rmarkdown/templates/tf/skeleton/tfq.bst create mode 100644 inst/rmarkdown/templates/tf/skeleton/tfs.bst diff --git a/R/article.R b/R/article.R index 7b0d3359d..a51c5e745 100644 --- a/R/article.R +++ b/R/article.R @@ -557,10 +557,23 @@ springer_article <- function(..., keep_tex = TRUE, citation_package = "natbib", #' @export #' @rdname article tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib") { - pdf_document_format( + format <- pdf_document_format( "tf", keep_tex = keep_tex, citation_package = citation_package, ... ) + pre_knit_fun <- format$pre_knit + format$pre_knit <- function(input, ...) { + if (is.function(pre_knit_fun)) pre_knit_fun(input, ...) + allowed_styles <- c("APA", "CAD", "NLM", "TFP", "TFQ", "TFS") + options <- rmarkdown::yaml_front_matter(input) + if (! options[["biblio-style"]] %in% allowed_styles) { + stop(paste( + "Invalid biblio-style in Taylor and Francis article. Allowed values are", + paste(allowed_styles, collapse = ", ") + )) + } + } + format } #' @section \code{trb_article}: Format for creating submissions to the Transportation diff --git a/inst/rmarkdown/templates/tf/resources/template.tex b/inst/rmarkdown/templates/tf/resources/template.tex index 371bed3fd..2e5e3f234 100644 --- a/inst/rmarkdown/templates/tf/resources/template.tex +++ b/inst/rmarkdown/templates/tf/resources/template.tex @@ -3,13 +3,40 @@ \documentclass[$for(classoption)$$classoption$$sep$,$endfor$]{interact} +\usepackage{etoolbox} \usepackage{epstopdf}% To incorporate .eps illustrations using PDFLaTeX, etc. \usepackage{subfigure}% Support for small, `sub' figures and tables %\usepackage[nolists,tablesfirst]{endfloat}% To `separate' figures and tables from text if required -\usepackage{natbib}% Citation support using natbib.sty -\bibpunct[, ]{(}{)}{;}{a}{}{,}% Citation support using natbib.sty -\renewcommand\bibfont{\fontsize{10}{12}\selectfont}% Bibliography support using natbib.sty +\newcommand{\BiblioStyleErrorMessage}{% + \errmessage{% + Invalid biblio-style in Taylor and Francis template. Allowed values are APA, CAD, NLM, TFP, TFQ, and TFS}} + +\ifstrequal{$biblio-style$}{APA}% + {\usepackage[natbibapa]{apacite}% Citation support using apacite.sty. Commands using natbib.sty MUST be deactivated first! + \setlength\bibhang{12pt}% To set the indentation in the list of references using apacite.sty. Commands using natbib.sty MUST be deactivated first! + \renewcommand\bibliographytypesize{\fontsize{10}{12}\selectfont}}% To set the list of references in 10 point font using apacite.sty. Commands using natbib.sty MUST be deactivated first! + {\ifboolexpr{% + test {\ifstrequal{$biblio-style$}{CAD}}% + or test {\ifstrequal{$biblio-style$}{}}}% Default + {\usepackage{natbib}}% Citation support using natbib.sty + {\ifboolexpr{% + test {\ifstrequal{$biblio-style$}{NLM}}% + or test {\ifstrequal{$biblio-style$}{TFQ}}% + or test {\ifstrequal{$biblio-style$}{TFS}}}% + {\usepackage[numbers,sort&compress]{natbib}% Citation support using natbib.sty + \ifstrequal{$biblio-style$}{NLM}% + {\makeatletter% @ becomes a letter + \def\NAT@def@citea{\def\@citea{\NAT@separator}}% Suppress spaces between citations using natbib.sty + \makeatother} + {}}% @ becomes a symbol again + {\ifstrequal{$biblio-style$}{TFP}% + {\usepackage[numbers,sort&compress,merge]{natbib}% Citation support using natbib.sty + \renewcommand\citenumfont[1]{\textit{#1}}% Citation numbers in italic font using natbib.sty + \renewcommand\bibnumfmt[1]{(#1)}}% Parentheses enclose ref. numbers in list using natbib.sty + {\BiblioStyleErrorMessage}}} + \bibpunct[, ]{[}{]}{,}{n}{,}{,}% Citation support using natbib.sty + \renewcommand\bibfont{\fontsize{10}{12}\selectfont}}% Bibliography support using natbib.sty \theoremstyle{plain}% Theorem-like structures provided by amsthm.sty \newtheorem{theorem}{Theorem}[section] @@ -202,7 +229,20 @@ $body$ $if(bibliography)$ -\bibliographystyle{$if(biblio-style)$$biblio-style$$else$tfcad$endif$} +\ifboolexpr{test {\ifstrequal{$biblio-style$}{CAD}} + or test {\ifstrequal{$biblio-style$}{}}}% + {\bibliographystyle{tfcad}}% + {\ifstrequal{$biblio-style$}{APA}% + {\bibliographystyle{apacite}}% + {\ifstrequal{$biblio-style$}{NLM}% + {\bibliographystyle{tfnlm}}% + {\ifstrequal{$biblio-style$}{TFP}% + {\bibliographystyle{tfp}}% + {\ifstrequal{$biblio-style$}{TFQ}% + {\bibliographystyle{tfq}}% + {\ifstrequal{$biblio-style$}{TFS}% + {\bibliographystyle{tfs}}% + {\BiblioStyleErrorMessage}}}}}}% Chigago Author-Date for backward compatibility \bibliography{$bibliography$} $endif$ diff --git a/inst/rmarkdown/templates/tf/skeleton/interact.cls b/inst/rmarkdown/templates/tf/skeleton/interact.cls index 8fdb95492..288f52f13 100644 --- a/inst/rmarkdown/templates/tf/skeleton/interact.cls +++ b/inst/rmarkdown/templates/tf/skeleton/interact.cls @@ -4,12 +4,12 @@ %% %% This file is part of a Taylor & Francis 'Interact' LaTeX bundle. %% -%% v1.03 - 2016/10/17 +%% v1.05 - 2017/07/31 %% %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \NeedsTeXFormat{LaTeX2e} -\ProvidesClass{interact}[2016/10/17 v1.03 Interact LaTeX document class] +\ProvidesClass{interact}[2017/07/31 v1.05 Interact LaTeX document class] % \newif\iflargeformat \newif\ifsuppldata @@ -228,6 +228,35 @@ % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Fonts %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Page styles %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +\def\endpage#1{\gdef\@endpage{#1}} +\endpage{}% +\def\jname#1{\gdef\@jname{#1}} +\gdef\@jname{} +\def\jvol#1{\gdef\@jvol{#1}} +\gdef\@jvol{00} +\def\jnum#1{\gdef\@jnum{#1}} +\gdef\@jnum{00} +\def\jmonth#1{\gdef\@jmonth{#1}} +\gdef\@jmonth{Month} +\def\jyear#1{\gdef\@jyear{#1}} +\gdef\@jyear{20XX} +\def\doi#1{\gdef\@doi{#1}} +\gdef\@doi{} +% +\def\ps@title{% + \let\@oddfoot\@empty + \let\@evenfoot\@empty + \def\@evenhead{}% + \def\@oddhead{}% + \let\@mkboth\@gobbletwo + \let\sectionmark\@gobble + \let\subsectionmark\@gobble + } +% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Page styles %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Title commands %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \def\articletype#1{\gdef\@articletype{{#1}}\MakeUppercase} @@ -278,48 +307,6 @@ \vskip13pt \egroup} % -\renewenvironment{abstract}{% - \par\addvspace{0pt plus2pt minus1pt} - \abstractfont\noindent{\bfseries \abstractname\\}\ignorespaces% -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% -\newenvironment{abbreviations}{% - \par\addvspace{13pt plus2pt minus1pt} - \abstractfont\noindent{\bfseries \abbreviationsname: }\ignorespaces% -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% -\newenvironment{keywords}{% - \par\addvspace{13pt plus2pt minus1pt} - \keywordfont\noindent{\bfseries \keywordsname\\}\ignorespaces% -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% -\newenvironment{amscode}{% - \par\addvspace{13pt plus2pt minus1pt} - \keywordfont\noindent{\bfseries{AMS CLASSIFICATION}\\}\ignorespaces% -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% -\newenvironment{jelcode}{% - \par\addvspace{13pt plus2pt minus1pt} - \keywordfont\noindent{\bfseries{JEL CLASSIFICATION}\\}\ignorespaces% -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% -\newenvironment{pacscode}{% - \par\addvspace{13pt plus2pt minus1pt} - \keywordfont\noindent{\bfseries{PACS CLASSIFICATION}\\}\ignorespaces% -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% %%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Title commands %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% %%%%%%%%%%%%%%%%%%%%%%%%%%%%% Sectioning commands %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% @@ -378,9 +365,9 @@ {\@ssect{#3}{#4}{#5}{#6}}% {\@dblarg{\@sect{#1}{#2}{#3}{#4}{#5}{#6}}}} % -\def\@sseccntformat#1{\csname the#1\endcsname.\quad} +\def\@sseccntformat#1{\csname the#1\endcsname.\hskip 0.5em} \def\@appseccntformat#1{\appendixname\ \csname the#1\endcsname.\ } -\def\@seccntformat#1{\csname the#1\endcsname.\quad} +\def\@seccntformat#1{\csname the#1\endcsname.\hskip 0.5em} \def\@sect#1#2#3#4#5#6[#7]#8{\ifnum #2>\c@secnumdepth \let\@svsec\@empty\else \refstepcounter{#1}% @@ -396,7 +383,7 @@ {\interlinepenalty \@M {#8}\par}% \else \ifnum#2=2 - \@hangfrom{\hskip #3\relax{\em\@svsec}}% + \@hangfrom{\hskip #3\relax\@svsec}% {\interlinepenalty \@M #8\par}% \else \@hangfrom{\hskip #3\relax\@svsec}% @@ -418,11 +405,158 @@ \fi #7}}\fi \@xsect{#5}} - +% %%%%%%%%%%%%%%%%%%%%%%%%%%% End Sectioning commands %%%%%%%%%%%%%%%%%%%%%%%%%%%%% -%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Appendix %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Lists %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +\newdimen\LabelSep +\LabelSep.5em +\newskip\TopSep +\TopSep 6\p@ %\@plus2\p@% \@minus1\p@ +% +\def\@listI{\leftmargin\leftmargini + \listparindent\parindent + \parsep \z@\labelsep\LabelSep + \topsep\TopSep + \itemsep0\p@} +% +\let\@listi\@listI +\@listi +% +\def\@listii {\leftmargin\leftmarginii + \labelwidth\leftmarginii + \listparindent\parindent + \parsep \z@\labelsep\LabelSep + \topsep 0pt%6\p@ \@plus2\p@ \@minus1\p@ + \parsep\z@\itemsep\z@} +\def\@listiii{\leftmargin\leftmarginiii + \listparindent\parindent + \labelwidth\leftmarginiii + \topsep 0pt + \parsep \z@ + \partopsep0pt + \itemsep0pt} +\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\leftmargini {2.5em} +\leftmargin \leftmargini +\setlength\leftmarginii {2.2em} +\setlength\leftmarginiii {1.87em} +\setlength\leftmarginiv {1.7em} +\setlength\leftmarginv {1em} +\setlength\leftmarginvi {1em} +\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} +\renewcommand\labelenumi{(\theenumi)} +\renewcommand\labelenumii{(\theenumii)} +\renewcommand\labelenumiii{(\theenumiii)} +\renewcommand\labelenumiv{(\theenumiv)} +\renewcommand\p@enumii{\theenumi} +\renewcommand\p@enumiii{\theenumi(\theenumii)} +\renewcommand\p@enumiv{\p@enumiii\theenumiii} +\renewcommand\labelitemi{$\m@th\bullet$} +\renewcommand\labelitemii{$\m@th\circ$} +\renewcommand\labelitemiii{\normalfont\textendash} +\renewcommand\labelitemiv{$\m@th\ast$} +% +%\renewenvironment{description}% +% {\list{}{\labelwidth\z@ \itemindent-\leftmargin +% \let\makelabel\descriptionlabel}} +% {\endlist} +%\renewcommand*\descriptionlabel[1]{\hspace\labelsep +% \normalfont\bfseries #1} +% +\renewenvironment{abstract}{% + \par\addvspace{0pt plus2pt minus1pt} + \abstractfont\noindent{\bfseries \abstractname\\}\ignorespaces% +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\newenvironment{abbreviations}{% + \par\addvspace{13pt plus2pt minus1pt} + \abstractfont\noindent{\bfseries \abbreviationsname: }\ignorespaces% +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\newenvironment{keywords}{% + \par\addvspace{13pt plus2pt minus1pt} + \keywordfont\noindent{\bfseries \keywordsname\\}\ignorespaces% +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\newenvironment{amscode}{% + \par\addvspace{13pt plus2pt minus1pt} + \keywordfont\noindent{\bfseries \amscodename\\}\ignorespaces% +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\newenvironment{jelcode}{% + \par\addvspace{13pt plus2pt minus1pt} + \keywordfont\noindent{\bfseries \jelcodename\\}\ignorespaces% +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\newenvironment{pacscode}{% + \par\addvspace{13pt plus2pt minus1pt} + \keywordfont\noindent{\bfseries \pacscodename\\}\ignorespaces% +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\renewenvironment{quote}{% + \par\addvspace{13pt plus2pt minus1pt} + \extractfont\noindent\ignorespaces +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\renewenvironment{quote}{% + \par\addvspace{6pt}\let\itemize\Itemize\let\enditemize\endItemize + \extractfont\noindent\ignorespaces +}{% + \par\addvspace{6pt} + \@endparenv} +% +\renewenvironment{quotation}{% + \par\addvspace{13pt plus2pt minus1pt} + \extractfont\ignorespaces +}{% + \par\addvspace{13pt plus2pt minus1pt} + \@endparenv} +% +\renewenvironment{quotation}{% + \par\addvspace{6pt}\let\itemize\Itemize\let\enditemize\endItemize + \extractfont\ignorespaces +}{% + \par\addvspace{6pt} + \@endparenv} +% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Lists %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Appendix %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% \renewcommand\appendix{% \let\@seccntformat\@appseccntformat \setcounter{equation}{0}\renewcommand\theequation{\thesection\arabic{equation}}% @@ -434,7 +568,7 @@ \@addtoreset{table}{section} \@addtoreset{figure}{section} } - +% %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Appendix %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Figures %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% @@ -446,7 +580,7 @@ \renewenvironment{figure*}% {\figcaptionfont\@dblfloat{figure}} {\end@dblfloat} - +% \def\ArtDir{art/}% \def\ArtPiece{\@ifnextchar[{\@ArtPiece}{\@ArtPiece[]}}% \def\@ArtPiece[#1]#2{\def\@tempa{#1}% @@ -514,8 +648,8 @@ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Captions %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % -\setlength\abovecaptionskip{7\p@} -\setlength\belowcaptionskip{\z@} +\setlength\abovecaptionskip{12\p@} +\setlength\belowcaptionskip{0\p@} % \def\FigName{figure} % @@ -543,111 +677,6 @@ % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Captions %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% -%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Lists %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% -% -\newdimen\LabelSep -\LabelSep.5em -\newskip\TopSep -\TopSep 6\p@ %\@plus2\p@% \@minus1\p@ -% -\def\@listI{\leftmargin\leftmargini - \listparindent\parindent - \parsep \z@\labelsep\LabelSep - \topsep\TopSep - \itemsep0\p@} -% -\let\@listi\@listI -\@listi -% -\def\@listii {\leftmargin\leftmarginii - \labelwidth\leftmarginii - \listparindent\parindent - \parsep \z@\labelsep\LabelSep - \topsep 0pt%6\p@ \@plus2\p@ \@minus1\p@ - \parsep\z@\itemsep\z@} -\def\@listiii{\leftmargin\leftmarginiii - \listparindent\parindent - \labelwidth\leftmarginiii - \topsep 0pt - \parsep \z@ - \partopsep0pt - \itemsep0pt} -\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\leftmargini {2.5em} -\leftmargin \leftmargini -\setlength\leftmarginii {2.2em} -\setlength\leftmarginiii {1.87em} -\setlength\leftmarginiv {1.7em} -\setlength\leftmarginv {1em} -\setlength\leftmarginvi {1em} -\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} -\renewcommand\labelenumi{(\theenumi)} -\renewcommand\labelenumii{(\theenumii)} -\renewcommand\labelenumiii{(\theenumiii)} -\renewcommand\labelenumiv{(\theenumiv)} -\renewcommand\p@enumii{\theenumi} -\renewcommand\p@enumiii{\theenumi(\theenumii)} -\renewcommand\p@enumiv{\p@enumiii\theenumiii} -\renewcommand\labelitemi{$\m@th\bullet$} -\renewcommand\labelitemii{$\m@th\circ$} -\renewcommand\labelitemiii{\normalfont\textendash} -\renewcommand\labelitemiv{$\m@th\ast$} -% -\renewenvironment{description}% - {\list{}{\labelwidth\z@ \itemindent-\leftmargin - \let\makelabel\descriptionlabel}} - {\endlist} -\renewcommand*\descriptionlabel[1]{\hspace\labelsep% - \normalfont\bfseries #1} -% -\renewenvironment{quote}{% - \par\addvspace{13pt plus2pt minus1pt} - \extractfont\noindent\ignorespaces -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% -\renewenvironment{quote}{% - \par\addvspace{6pt}\let\itemize\Itemize\let\enditemize\endItemize - \extractfont\noindent\ignorespaces -}{% - \par\addvspace{6pt} - \@endparenv} -% -\renewenvironment{quotation}{% - \par\addvspace{13pt plus2pt minus1pt} - \extractfont\ignorespaces -}{% - \par\addvspace{13pt plus2pt minus1pt} - \@endparenv} -% -\renewenvironment{quotation}{% - \par\addvspace{6pt}\let\itemize\Itemize\let\enditemize\endItemize - \extractfont\ignorespaces -}{% - \par\addvspace{6pt} - \@endparenv} -% -%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Lists %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% - %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Footnotes %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% % \renewcommand\footnoterule{% @@ -661,35 +690,6 @@ % %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Footnotes %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% -%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Page styles %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% -% -\def\endpage#1{\gdef\@endpage{#1}} -\endpage{}% -\def\jname#1{\gdef\@jname{#1}} -\gdef\@jname{} -\def\jvol#1{\gdef\@jvol{#1}} -\gdef\@jvol{00} -\def\jnum#1{\gdef\@jnum{#1}} -\gdef\@jnum{00} -\def\jmonth#1{\gdef\@jmonth{#1}} -\gdef\@jmonth{Month} -\def\jyear#1{\gdef\@jyear{#1}} -\gdef\@jyear{20XX} -\def\doi#1{\gdef\@doi{#1}} -\gdef\@doi{} -% -\def\ps@title{% - \let\@oddfoot\@empty - \let\@evenfoot\@empty - \def\@evenhead{}% - \def\@oddhead{}% - \let\@mkboth\@gobbletwo - \let\sectionmark\@gobble - \let\subsectionmark\@gobble - } -% -%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% End Page styles %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% - %%%%%%%%%%%%%%%%%%%%%%%%%%%% Theorem-like structures %%%%%%%%%%%%%%%%%%%%%%%%%%%% % \renewenvironment{proof}[1][\proofname]{\par @@ -712,9 +712,12 @@ % %%%%%%%%%%%%%%%%%%%%%%%%%% End Theorem-like structures %%%%%%%%%%%%%%%%%%%%%%%%%% % -\newcommand\abbreviationsname{Abbreviations} \renewcommand\abstractname{ABSTRACT} +\newcommand\abbreviationsname{Abbreviations} \newcommand\keywordsname{KEYWORDS} +\newcommand\amscodename{AMS CLASSIFICATION} +\newcommand\jelcodename{JEL CLASSIFICATION} +\newcommand\pacscodename{PACS CLASSIFICATION} % \setlength\parskip{0\p@} \setlength\columnsep{12\p@} diff --git a/inst/rmarkdown/templates/tf/skeleton/tfnlm.bst b/inst/rmarkdown/templates/tf/skeleton/tfnlm.bst new file mode 100644 index 000000000..04c5bd022 --- /dev/null +++ b/inst/rmarkdown/templates/tf/skeleton/tfnlm.bst @@ -0,0 +1,1778 @@ +%% +%% This is file `tfnlm.bst', +%% generated with the docstrip utility, +%% modified by DjL 2016/08/10 +%% ------------------------------------- +%% +%% *** BibTeX style for Taylor & Francis NLM reference style as described at +%% http://www.tandf.co.uk/journals/authors/style/reference/tf_NLM.pdf *** +%% + % =================================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files. + % + % This 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}[2011/11/18 4.33 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + % Copyright 1994-2011 Patrick W Daly + %-------------------------------------------------------------------- + % 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[p.2]{key} ==>> [#, p.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 + collaboration + edition + editor + eid + howpublished + institution + journal + key + lastchecked + month + note + number + numpages + organization + pages + publisher + school + series + title + type + url + volume + year + } + {} + { 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} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} + +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.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 {no.blank.or.punct} +{ "\hspace{0pt}" * before.all 'output.state := +} + +FUNCTION {date.block} +{ + ";" * + no.blank.or.punct +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + +STRINGS {z} + +FUNCTION {remove.dots} +{ 'z := + "" + { z empty$ not } + { z #1 #2 substring$ + duplicate$ "\." = + { z #3 global.max$ substring$ 'z := * } + { pop$ + z #1 #1 substring$ + z #2 global.max$ substring$ 'z := + duplicate$ "." = 'pop$ + { * } + if$ + } + 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} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" 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.editors} +{ "editors" } + +FUNCTION {bbl.editor} +{ "editor" } + +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.eidpp} +{ "pages" } + +FUNCTION {bbl.chapter} +{ "Chapter" } + +FUNCTION {bbl.techrep} +{ "" }% + +FUNCTION {bbl.mthesis} +{ "[master's thesis]" } + +FUNCTION {bbl.phdthesis} +{ "[dissertation]" } + +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$ +} + + %------------------------------------------------------------------- + % 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-2011 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$ + 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$ +} + +FUNCTION {format.url} +{ + url + duplicate$ empty$ + { pop$ "" } + { "\urlprefix\url{" swap$ * "}" * } + if$ +} + +FUNCTION {format.lastchecked} +{ lastchecked duplicate$ empty$ 'skip$ + { + no.blank.or.punct + "~[cited~" swap$ * "]" * + } + if$ +} + +INTEGERS { nameptr namesleft numnames } + +STRINGS { bibinfo} + +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$ + remove.dots + bibinfo bibinfo.check + 't := + nameptr #1 > + { + nameptr #3 % truncate lists of more than 3 authors to 3 et al. + #1 + = + numnames #3 % allow a maximum of 3 names in the list of authors + > 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.ed} +{ + format.names +} + +FUNCTION {format.key} +{ empty$ + { key field.or.null } + { "" } + if$ +} + +FUNCTION {format.authors} +{ author "author" format.names + duplicate$ empty$ 'skip$ + { collaboration "collaboration" bibinfo.check + duplicate$ empty$ 'skip$ + { " (" swap$ * ")" * } + if$ + * + } + if$ +} + +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.editor + * + } + 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 {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} +{ year "year" bibinfo.check duplicate$ empty$ + { + "empty year in " cite$ * "; set to ????" * warning$ + pop$ "????" + } + 'skip$ + if$ + month "month" bibinfo.check duplicate$ empty$% These lines include the month if present + 'skip$% + {% + swap$% + " " * swap$% + }% + if$% + *% + remove.dots% + before.all 'output.state := + ". " swap$ * +} + +FUNCTION {format.plaindate} +{ year "year" bibinfo.check duplicate$ empty$ + { + "empty year in " cite$ * "; set to ????" * warning$ + pop$ "????" + } + 'skip$ + if$ + before.all 'output.state := + "; " swap$ * +} + +FUNCTION {format.btitle} +{ title "title" bibinfo.check + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ +} + +FUNCTION {format.ptitle}% For titles of conference proceedings +{ 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$ * "; " * swap$ * ")" *}% + if$ + "volume and number" number either.or.check + } + if$ +} + +FUNCTION {format.pvolume}% For conference proceedings +{ volume empty$ + { "" } + { bbl.volume volume tie.or.space.prefix + "volume" bibinfo.check * * + series "series" bibinfo.check + duplicate$ empty$ 'pop$ + {"(" swap$ * "; " * swap$ * ")" *}% + 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 = + { "" } + { "" } + if$ + number "number" bibinfo.check * + series "series" bibinfo.check + duplicate$ empty$ 'pop$ + {"(" swap$ * "; " * swap$ * ")" *}% + if$ + } + 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.journal.eid} +{ eid "eid" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ 'skip$ + { + ":" * + } + if$ + swap$ * + numpages empty$ 'skip$ + { bbl.eidpp numpages tie.or.space.prefix + "numpages" bibinfo.check * * + " (" swap$ * ")" * * + } + if$ + } + if$ +} + +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + number "number" bibinfo.check duplicate$ empty$ 'skip$% These lines include the contents of the number field if present + {% + swap$ duplicate$ empty$% + { "there's a number but no volume in " cite$ * warning$ }% + 'skip$% + if$% + swap$% + "(" swap$ * ")" *% + }% + if$ *% +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + { "" } + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.booktitle} +{ + booktitle "booktitle" bibinfo.check + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ +} + +FUNCTION {format.proctitle}% For titles of conference proceedings +{ + booktitle "booktitle" bibinfo.check + duplicate$ empty$ 'skip$ +% { "t" change.case$ }% Proceedings titles remain in Title Case + { + } + if$ +} + +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.proctitle}% For use in proceedings titles +{ format.proctitle 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.article.crossref} +{ + key duplicate$ empty$ + { pop$ + journal duplicate$ empty$ + { "need key or journal for " cite$ * " to crossref " * crossref * warning$ } + { "journal" bibinfo.check capitalize 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 + * + } + { #2 < + 'skip$ + { editor #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + "editor" bibinfo.check + " " * bbl.etal + * + } + { + bbl.and space.word + * 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 := + "" + 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}% For use in FUNCTION {techreport} +{ institution "institution" bibinfo.warn format.org.or.pub +} + +FUNCTION {format.school.address}% For use in FUNCTION {mastersthesis} and FUNCTION {phdthesis} +{ school "school" bibinfo.warn format.org.or.pub +} + +FUNCTION {format.conference.address}% For use in FUNCTION {inproceedings} and FUNCTION {proceedings} +{ address "address" bibinfo.check +} + +FUNCTION {format.month}% For use in FUNCTIONS {inproceedings} and {proceedings} +{ month empty$ + { "" } + { month "month" bibinfo.check + "" swap$ * "" *} + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check + new.sentence + crossref missing$ + { + journal + remove.dots + "journal" bibinfo.check + "journal" output.check + format.date "year" output.check + date.block + format.vol.num.pages output + } + { + format.article.crossref output.nonnull + } + if$ + eid empty$ + { format.journal.pages } + { format.journal.eid } + if$ + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {book} +{ 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.sentence + format.btitle "title" output.check + crossref missing$ + new.sentence + { format.edition output + new.sentence% + format.bvolume output + new.sentence + format.publisher.address output.nonnull + } + { + new.sentence + format.book.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + new.sentence + format.number.series output% + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {booklet} +{ output.bibitem + format.authors output + new.sentence + format.title "title" output.check + new.sentence + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + format.plaindate output% + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + new.sentence + format.btitle "title" output.check + new.sentence + crossref missing$ + { + format.edition output + new.sentence% + format.bvolume output + new.sentence + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + new.sentence + format.book.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + new.sentence + format.chapter.pages "chapter and pages" output.check + format.pages "pages" output.check + new.sentence + format.number.series output% + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check + new.sentence + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + new.sentence + format.edition output + format.bvolume output + format.chapter.pages output + new.sentence% + format.publisher.address output + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + format.plaindate "year" output.check + new.sentence + format.number.series output% + format.pages "pages" output.check + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check + new.sentence + crossref missing$ + { format.in.ed.proctitle "booktitle" output.check + format.pvolume output% + format.month output% + organization output% + format.conference.address output% + new.sentence% + publisher output% + } + { format.incoll.inproc.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + new.sentence + format.pages "pages" output.check + format.number.series output% + new.sentence + format.note output + format.lastchecked output + format.url 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.sentence + format.btitle "title" output.check + new.sentence + format.edition output% + new.sentence% + author empty$ + { organization empty$ + { + address "address" bibinfo.check output + } + 'skip$ + if$ + } + { + format.organization.address output% + } + if$ + format.plaindate output + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title + "title" output.check + add.blank% + bbl.mthesis format.thesis.type output.nonnull + new.sentence + format.school.address output% + format.plaindate "year" output.check + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + new.sentence + format.title output + add.blank% + howpublished missing$ 'skip$% + {"[" howpublished capitalize * "]" * output}% + if$% + format.plaindate output% + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry + empty.misc.check +} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title + "title" output.check + add.blank% + bbl.phdthesis format.thesis.type output.nonnull + new.sentence + format.school.address output% + format.plaindate "year" output.check + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {presentation} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.ptitle "title" output.check + format.month output + format.organization.address "organization and address" output.check + new.sentence% + format.note output + new.sentence + type missing$ 'skip$ + {"(" type capitalize * ")" * output} + if$ + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization "organization" bibinfo.check output + } + { format.editors output.nonnull } + if$ + new.sentence + format.ptitle "title" output.check + format.pvolume output + format.month output% + organization output% + format.conference.address output% + new.sentence% + publisher output% + new.sentence + format.plaindate "year" output.check + new.sentence + format.number.series output + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title + "title" output.check + new.sentence + format.institution.address output% + format.plaindate "year" output.check + new.sentence + format.tr.number output.nonnull + new.sentence + format.note output + format.lastchecked output + format.url output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check + format.plaindate output + new.sentence + format.lastchecked output + numpages output + new.sentence + format.note output% + format.url 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$ + "\providecommand{\url}[1]{\normalfont{#1}}" + write$ newline$ + "\providecommand{\urlprefix}{Available from: }" + 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 `tfnlm.bst'. diff --git a/inst/rmarkdown/templates/tf/skeleton/tfp.bst b/inst/rmarkdown/templates/tf/skeleton/tfp.bst new file mode 100644 index 000000000..4573835f7 --- /dev/null +++ b/inst/rmarkdown/templates/tf/skeleton/tfp.bst @@ -0,0 +1,1763 @@ +%% +%% This is file `tfp.bst', +%% generated with the docstrip utility, +%% modified by DjL 2016/06/17 +%% ------------------------------------- +%% +%% *** BibTeX style for Taylor & Francis Reference Style P as described at +%% http://www.tandf.co.uk/journals/authors/style/reference/tf_P.pdf *** +%% + % =================================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files. + % + % This 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}[2011/11/18 4.33 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + % Copyright 1994-2011 Patrick W Daly + %-------------------------------------------------------------------- + % 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 + collaboration + edition + editor + eid + howpublished + institution + journal + key + lastchecked + month + note + number + numpages + organization + pages + publisher + school + series + title + type + url + volume + year + } + {} + { 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 = + { "; " * 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 {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} +{ + skip$ +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + +STRINGS {z} + +FUNCTION {remove.dots} +{ 'z := + "" + { z empty$ not } + { z #1 #2 substring$ + duplicate$ "\." = + { z #3 global.max$ substring$ 'z := * } + { pop$ + z #1 #1 substring$ + z #2 global.max$ substring$ 'z := + duplicate$ "." = 'pop$ + { * } + if$ + } + 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} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" swap$ * "}" * } + if$ +} + +FUNCTION {embolden} +{ 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.editors} +{ "Eds." } + +FUNCTION {bbl.editor} +{ "Ed." } + +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} +{ "pp" } + +FUNCTION {bbl.page} +{ "p" } + +FUNCTION {bbl.eidpp} +{ "pages" } + +FUNCTION {bbl.chapter} +{ "Chapter" } + +FUNCTION {bbl.techrep} +{ "Technical Report" } + +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} {"March"} +MACRO {apr} {"April"} +MACRO {may} {"May"} +MACRO {jun} {"June"} +MACRO {jul} {"July"} +MACRO {aug} {"Aug"} +MACRO {sep} {"Sept"} +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$ +} + + %------------------------------------------------------------------- + % 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-2011 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$ + 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$ +} + +FUNCTION {format.url} +{ url + duplicate$ empty$ + { pop$ "" } + { "\urlprefix\url{" swap$ * "}" * } + if$ +} + +FUNCTION {format.lastchecked} +{ lastchecked empty$ + { "" } + { + add.blank "(accessed " lastchecked * ")" * + } + if$ +} + +INTEGERS { nameptr namesleft numnames } + +STRINGS { bibinfo} + +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 #0 + #10 + + #1 + = + numnames #0 + #10 + + > 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.ed} +{ '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 #0 + #10 + + #1 + = + numnames #0 + #10 + + > 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.authors} +{ author "author" format.names + duplicate$ empty$ 'skip$ + { collaboration "collaboration" bibinfo.check + duplicate$ empty$ 'skip$ + { " (" swap$ * ")" * } + if$ + * + } + if$ +} + +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {format.editors} +{ editor "editor" format.names.ed duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.editor + * + } + 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 + "title" bibinfo.check +} + +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 + " " * } + +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$ + * + remove.dots + } + if$ + embolden + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + " " swap$ * + } + if$ +} + +FUNCTION {format.plaindate} +{ + "" + 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$ + * + remove.dots + } + 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$ * } + 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 = + { "" } + { "" } + if$ + series empty$ + { "there's a number but no series in " cite$ * warning$ } + { series "series" bibinfo.check * + number tie.or.space.prefix "number" 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.journal.eid} +{ eid "eid" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ 'skip$ + { + ", " * + } + if$ + swap$ * + numpages empty$ 'skip$ + { bbl.eidpp numpages tie.or.space.prefix + "numpages" bibinfo.check * * + " (" swap$ * ")" * * + } + if$ + } + if$ +} + +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + emphasize + 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.chapter.pages} +{ chapter empty$ + { "" } + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.booktitle} +{ + booktitle "booktitle" bibinfo.check + emphasize +} + +FUNCTION {format.in.ed.booktitle} +{ + booktitle "booktitle" bibinfo.check + word.in swap$ emphasize * "" * +} + +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$ + "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$ + } + { 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 + * + } + { #2 < + 'skip$ + { editor #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + "editor" bibinfo.check + " " * bbl.etal + * + } + { + bbl.and space.word + * 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 + 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 := + "" + address empty$ t empty$ and + 'skip$ + { + t empty$ + { address "address" bibinfo.check * + } + { t * + address empty$ + 'skip$ + { ": " * address "address" bibinfo.check * } + if$ + } + 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.warn format.org.or.pub +} + +FUNCTION {format.month} +{ month empty$ + { "" } + { month "month" bibinfo.check + "" swap$ * "" *} + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check %%% Comment this line to omit article titles + crossref missing$ + { + journal + "journal" bibinfo.check + emphasize + "journal" output.check + add.blank + format.date "year" output.check + format.vol.num.pages output + } + { format.article.crossref output.nonnull + } + if$ + eid empty$ + { format.journal.pages } + { format.journal.eid } + if$ + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {book} +{ 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.sentence + format.btitle "title" output.check + crossref missing$ + { format.edition output + new.block + format.number.series output + new.block + format.publisher.address output + } + { + format.book.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + new.block + format.bvolume output + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {booklet} +{ output.bibitem + format.authors output + new.sentence + format.title "title" output.check + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + format.plaindate output + new.sentence + format.note output + format.url output + format.lastchecked 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.sentence + format.btitle "title" output.check + crossref missing$ + { + format.edition output + format.editors output + new.block + format.number.series output + new.block + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + format.book.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + new.block + format.bvolume output + format.chapter.pages "chapter and pages" output.check + format.pages "pages" output.check + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check %%% Comment this line to omit chapter titles + new.sentence + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.edition output + new.block + format.editors output + new.block + format.number.series output + new.block + format.publisher.address output + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + format.plaindate "year" output.check + new.block + format.bvolume output + format.chapter.pages output + format.pages "pages" output.check + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check %%% Comment this line to omit chapter titles + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + organization output + address output + format.month output + new.block + format.editors output + new.block + format.number.series output + new.block + publisher output + } + { format.incoll.inproc.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + new.block + format.bvolume output + format.pages "pages" output.check + new.sentence + format.note output + format.url output + format.lastchecked 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$ + format.btitle "title" output.check + format.edition output + author empty$ + { organization empty$ + { + address "address" bibinfo.check output + } + 'skip$ + if$ + } + { + organization "organization" bibinfo.check output + address "address" bibinfo.check output + } + if$ + format.month output + format.plaindate output + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check + new.sentence + bbl.mthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.month output + format.plaindate "year" output.check + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + new.sentence + format.title output + howpublished "howpublished" bibinfo.check output + format.month output + format.plaindate output + format.pages output + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry + empty.misc.check +} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check + new.sentence + bbl.phdthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.month output + format.plaindate "year" output.check + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {presentation} +{ output.bibitem + format.authors output + new.sentence + format.title output + format.organization.address "organization and address" output.check + format.month output + year output + new.sentence + format.note output + new.sentence + type missing$ 'skip$ + {"(" type capitalize * ")" * output} + if$ + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization "organization" bibinfo.check output + } + { format.editors output.nonnull } + if$ + new.sentence + format.btitle "title" output.check + organization output + address output + format.month output + new.block + publisher output + format.plaindate "year" output.check + new.block + format.bvolume output + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.btitle "title" output.check + new.block + format.tr.number output.nonnull + new.block + format.institution.address output + format.month output + format.plaindate "year" output.check + new.sentence + format.note output + format.url output + format.lastchecked output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + new.sentence + format.title "title" output.check + new.sentence + format.plaindate output + new.sentence + format.note "note" output.check + format.url output + format.lastchecked 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$ + "\providecommand{\url}[1]{\normalfont{#1}}" + write$ newline$ + "\providecommand{\urlprefix}{}" + 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 `tfp.bst'. diff --git a/inst/rmarkdown/templates/tf/skeleton/tfq.bst b/inst/rmarkdown/templates/tf/skeleton/tfq.bst new file mode 100644 index 000000000..ebad6b505 --- /dev/null +++ b/inst/rmarkdown/templates/tf/skeleton/tfq.bst @@ -0,0 +1,1963 @@ +%% +%% This is file `tfq.bst', +%% generated with the docstrip utility, +%% modified by DjL 2016/06/15 +%% ------------------------------------------------------------------- +%% +%% *** BibTeX style for Taylor & Francis reference style Q as described at +%% http://www.tandf.co.uk/journals/authors/style/reference/tf_Q.pdf *** +%% + % =================================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files. + % + % This 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}[2011/11/18 4.33 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + % Copyright 1994-2011 Patrick W Daly + %-------------------------------------------------------------------- + % 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 + author + booktitle + chapter + chaptertitle + edition + editor + eid + englishtitle + howpublished + institution + journal + key + month + note + number + organization + pages + publisher + school + series + title + translator + trntitle + type + url + volume + year + } + {} + { 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} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} + +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.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} +{ + skip$ +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + +STRINGS {z} + +FUNCTION {remove.dots} +{ 'z := + "" + { z empty$ not } + { z #1 #1 substring$ + z #2 global.max$ substring$ 'z := + duplicate$ "." = 'pop$ + { * } + 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} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" 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.editors} +{ "eds." } + +FUNCTION {bbl.editor} +{ "ed." } + +FUNCTION {bbl.edby} +{ "edited by" } + +FUNCTION {bbl.edin} +{ "{\itshape {In}}: " } + +FUNCTION {bbl.edition} +{ "ed." } + +FUNCTION {bbl.translator} +{ " (Transl.)" } + +FUNCTION {bbl.volume} +{ "Vol." } + +FUNCTION {bbl.of} +{ "of" } + +FUNCTION {bbl.number} +{ "no." } + +FUNCTION {bbl.nr} +{ "no." } + +FUNCTION {bbl.in} +{ "in" } + +FUNCTION {bbl.pages} +{ "pp." } + +FUNCTION {bbl.page} +{ "p." } + +FUNCTION {bbl.chapter} +{ "chap." } + +FUNCTION {bbl.chaptertitle} +{ "Chapter title." } + +FUNCTION {bbl.techrep} +{ "Tech. {R}ep." } + +FUNCTION {bbl.mthesis} +{ "Master's thesis" } + +FUNCTION {bbl.phdthesis} +{ "Ph.D. diss." } + +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$ +} + + %------------------------------------------------------------------- + % 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-2011 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$ + 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$ +} + +INTEGERS { nameptr namesleft numnames } + +STRINGS { bibinfo} + +FUNCTION {end.quote.title} +{ title empty$ + 'skip$ + { before.all 'output.state := } + if$ +} + +FUNCTION {format.school} +{school "school" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + "" swap$ * "" * + } + if$ +} + +FUNCTION {format.names} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{f{.}.}{ vv~}{ ll}{ jj}" + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + nameptr #1 + #1 + = + numnames #100 + > and + { "others" 't := + #1 'namesleft := } + 'skip$ + if$ + namesleft #1 > + { ", " * t * } + { + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + numnames #2 > + t "others" = not and + { "," * } + 'skip$ + if$ + t "others" = + { + ", " * bbl.etal emphasize * + } + { + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} + +FUNCTION {format.names.ed} +{ + format.names +} + +FUNCTION {format.key} +{ empty$ + { key field.or.null } + { "" } + if$ +} + +FUNCTION {format.authors} +{ author "author" format.names +} + +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + " " * + get.bbl.editor + "(" swap$ * ")" * + * + } + if$ +} + +FUNCTION {format.noeditors} +{ bbl.edin * "" * +} + +FUNCTION {format.plaineditors} +{ editor "editor" format.names empty$ 'skip$ + { + bbl.edin swap$ * + "" * + get.bbl.editor +%% capitalize + ", " swap$ * "" * * + } + if$ +} + +FUNCTION {format.note} +{ + url empty$ + 'skip$ + { "\urlprefix\url{" url * "}" * output } + if$ + 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 + duplicate$ empty$ 'skip$ + { + emphasize + } + if$ +} + +FUNCTION {format.inproctitle} +{ title + "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + emphasize + "" swap$ * + ", " * + } + if$ +} + +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 + " " * } + +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$ + * + remove.dots + } + if$ + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + " (" swap$ * ")" * + } + if$ +} + +FUNCTION {format.unpubdate} +{ + "" + 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$ + * + remove.dots + } + if$ + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + ", " swap$ * + } + if$ +} + +FUNCTION{format.year} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + " (" swap$ * ")" * + } + if$ +} + +FUNCTION{format.inprocyear} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + "" swap$ * "" * + } + if$ +} + +FUNCTION {format.inprocdate} +{ year "year" + bibinfo.check + duplicate$ empty$ + { + "empty year in " cite$ * "; set to ????" * warning$ + pop$ "????" + } + 'skip$ + if$ + before.all + ", " swap$ * + 'output.state := + ", " * +} + +FUNCTION {format.intechrdate} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + " " swap$ * "" * + } + if$ +} + +FUNCTION {format.sanspardate} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + " " swap$ * "" * + } + if$ +} + +FUNCTION {format.plaindate} +{ year "year" bibinfo.check duplicate$ empty$ + { + "empty year in " cite$ * "; set to ????" * warning$ + pop$ "????" + } + 'skip$ + if$ + month "month" bibinfo.check duplicate$ empty$ + 'skip$ + { + swap$ + " " * swap$ + } + if$ + * + remove.dots + before.all 'output.state := + ", " swap$ * +} + +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$ + %{ emphasize ", " * swap$ * } + { " " * swap$ * } + 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.number.plainseries} +{ 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$ + { + convert.edition + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + " " * bbl.edition * + } + if$ +} + +FUNCTION {format.translator} +{ +translator "translator" bibinfo.check + " [{\itshape English translation}], " swap$ * bbl.translator * +} + +FUNCTION {format.inprocedition} +{ edition duplicate$ empty$ 'skip$ + { + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + add.blank + " " swap$ " " * 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 multi.page.check + 'bbl.pages + 'bbl.page + if$ + swap$ tie.or.space.prefix + "pages" bibinfo.check + * * + * + } + if$ + } + if$ +} + +FUNCTION {format.journal.eid} +{ eid "eid" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ 'skip$ + { + ", " * + } + if$ + swap$ * + } + if$ +} + +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + format.year * +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + { "" } + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.inprocchapter.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.chaptertitle} +{ + chaptertitle "chaptertitle" bibinfo.check + emphasize +} + +FUNCTION {format.englishtitle} +{ + englishtitle "englishtitle" bibinfo.check + emphasize +} + +FUNCTION {format.trntitle} +{ + trntitle "title" bibinfo.check + emphasize +} + +FUNCTION {format.trnbookedition} +{ edition duplicate$ empty$ 'skip$ + { "edition" bibinfo.check + add.blank ", " swap$ * + "" * + } + if$ +} + +FUNCTION {format.in.ed.booktitle} +{ format.booktitle duplicate$ empty$ 'skip$ + { + editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { + get.bbl.editor + swap$ "," * + " " * swap$ * + swap$ + "," * + " " * 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 + key empty$ not and + { "all relevant fields are empty in " cite$ * warning$ } + 'skip$ + if$ +} + +FUNCTION {format.chapter} +{ chapter empty$ + 'format.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.inchapter} +{ chapter + "chapter" bibinfo.check + duplicate$ empty$ 'skip$ + { + "" swap$ * + ". " * + } + 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 + * + } + { #2 < + 'skip$ + { editor #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + "editor" bibinfo.check + " " * bbl.etal + * + } + { + bbl.and space.word + * 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 + 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 := + "" + address empty$ t empty$ and + 'skip$ + { + t empty$ + { address "address" bibinfo.check * + } + { t * + address empty$ + 'skip$ + { ", " * address "address" bibinfo.check * } + if$ + } + 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.conference.address} +{ address "address" bibinfo.check +} + +FUNCTION {format.month} +{ month empty$ + { "" } + { month "month" bibinfo.check + "" swap$ * "" *} + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.title "title" output.check + crossref missing$ + { + journal + "journal" bibinfo.check + "journal" output.check + add.blank + format.vol.num.pages output + } + { format.article.crossref output.nonnull + } + if$ + eid empty$ + { format.journal.pages } + { format.journal.eid } + if$ + format.note output + fin.entry +} + +FUNCTION {book} +{ 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$ + format.btitle "title" output.check + format.edition output + crossref missing$ + { format.bvolume output + format.number.series output + format.publisher.address output + end.quote.title + } + { + format.book.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + date.block + format.note output + fin.entry +} + +FUNCTION {booklet} +{ output.bibitem + format.authors output + format.title "title" output.check + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + format.date output + format.note output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.btitle "title" output.check + format.edition output + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.bvolume output + format.chapter.pages "chapter and pages" output.check + format.number.series output + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + new.block + format.book.crossref output.nonnull + } + if$ + format.date "year" output.check + format.pages "pages" output.check + format.note output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.edition output + format.bvolume output + format.chapter.pages output + format.number.series output + format.publisher.address output + format.sanspardate "year" output.check + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + format.pages "pages" output.check + format.note output + fin.entry +} + +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.inproctitle "title" output.check + end.quote.title + crossref missing$ + { format.inprocedition output + format.in.ed.booktitle "booktitle" output.check + format.bvolume output + format.month output% + format.conference.address output% + new.sentence% + organization output% + publisher output% + format.chapter.pages output + format.number.plainseries output + } + { format.incoll.inproc.crossref output.nonnull + } + if$ + format.inprocyear "year" output.check + format.inprocchapter.pages output + format.note output + fin.entry +} + +FUNCTION {translatedbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + add.blank + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.plaindate "year" output.check + end.quote.title + format.chaptertitle "chaptertitle" output.check + add.blank + format.trntitle "title" output.check + add.blank + format.englishtitle "englishtitle" output.check + add.blank + format.trnbookedition output + crossref missing$ + { format.bvolume output + format.number.series output + format.publisher.address output + } + { + format.book.crossref output.nonnull + } + if$ + format.note output + fin.entry +} + +FUNCTION {intranslatedbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.btitle "title" output.check + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + end.quote.title + format.translator "translator" output.check + format.bvolume output + format.chapter.pages "chapter and pages" output.check + format.number.series output + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + new.block + format.book.crossref output.nonnull + } + if$ + format.date "year" output.check + format.pages "pages" output.check + format.note 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$ + format.btitle "title" output.check + author empty$ + { organization empty$ + { + address "address" bibinfo.check output + } + 'skip$ + if$ + } + { + organization "organization" bibinfo.check output + address "address" bibinfo.check output + } + if$ + format.edition output + format.date output + format.note output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + bbl.mthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.sanspardate "year" output.check + format.note output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + format.title output + howpublished "howpublished" bibinfo.check output + format.date output + new.sentence + format.note output + fin.entry + empty.misc.check +} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + bbl.phdthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.sanspardate "year" output.check + format.note output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization "organization" bibinfo.check output } + { format.editors output.nonnull } + if$ + format.btitle "title" output.check + format.bvolume output + address empty$ + { editor empty$ + 'skip$ + { organization output } + if$ + publisher output + format.sanspardate "year" output.check + } + { format.month output + format.conference.address output + new.sentence + editor empty$ + 'skip$ + { organization output } + if$ + publisher output + format.sanspardate "year" output.check + } + if$ +% format.date "year" output.check + format.note output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + format.tr.number output.nonnull + institution "institution" bibinfo.warn output + address "address" bibinfo.check output + format.intechrdate "year" output.check + format.note output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + format.unpubdate output + journal "journal" bibinfo.check + "journal" output.check + new.sentence + format.note 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$ +% "\newcommand{\noopsort}[1]{} " +% write$ newline$ + "\newcommand{\printfirst}[2]{#1} " + write$ newline$ +% "\newcommand{\singleletter}[1]{#1} " +% write$ newline$ + "\newcommand{\switchargs}[2]{#2#1} " + write$ newline$ + "\providecommand{\url}[1]{\normalfont{#1}}" + write$ newline$ + "\providecommand{\urlprefix}{Available at }" + 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 `tfq.bst'. diff --git a/inst/rmarkdown/templates/tf/skeleton/tfs.bst b/inst/rmarkdown/templates/tf/skeleton/tfs.bst new file mode 100644 index 000000000..e4db42b99 --- /dev/null +++ b/inst/rmarkdown/templates/tf/skeleton/tfs.bst @@ -0,0 +1,2140 @@ +%% +%% This is file `tfs.bst', +%% generated with the docstrip utility, +%% modified by DjL 2016/06/28 +%% ------------------------------------------------------------------- +%% +%% *** BibTeX style for Taylor & Francis reference style S as described at +%% http://www.tandf.co.uk/journals/authors/style/reference/tf_S.pdf *** +%% + % =================================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files. + % + % This 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}[2011/11/18 4.33 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + % Copyright 1994-2011 Patrick W Daly + %-------------------------------------------------------------------- + % 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 alphabetical by authors. + %-------------------------------------------------------------------- + +ENTRY + { address + author + booktitle + chapter + chaptertitle + edition + editor + eid + englishtitle + howpublished + institution + journal + key + month + mrnumber + note + number + organization + pages + publisher + school + series + title + translator + trntitle + type + url + volume + year + } + {} + { 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} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} + +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} + +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} +{ + skip$ +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} + +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} + +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} + +STRINGS {z} + +FUNCTION {remove.dots} +{ 'z := + "" + { z empty$ not } + { z #1 #1 substring$ + z #2 global.max$ substring$ 'z := + duplicate$ "." = 'pop$ + { * } + 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} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" 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.editors} +{ "eds." } + +FUNCTION {bbl.editor} +{ "ed." } + +FUNCTION {bbl.edby} +{ "edited by" } + +FUNCTION {bbl.edin} +{ "{\itshape {In}}: " } + +FUNCTION {bbl.edition} +{ "ed." } + +FUNCTION {bbl.translator} +{ " (Transl.)" } + +FUNCTION {bbl.volume} +{ "Vol." } + +FUNCTION {bbl.of} +{ "of" } + +FUNCTION {bbl.number} +{ "no." } + +FUNCTION {bbl.nr} +{ "no." } + +FUNCTION {bbl.in} +{ "in" } + +FUNCTION {bbl.pages} +{ "pp." } + +FUNCTION {bbl.page} +{ "p." } + +FUNCTION {bbl.chapter} +{ "chap." } + +FUNCTION {bbl.chaptertitle} +{ "Chapter title." } + +FUNCTION {bbl.techrep} +{ "Tech. {R}ep." } + +FUNCTION {bbl.mthesis} +{ "Master's thesis" } + +FUNCTION {bbl.phdthesis} +{ "Ph.D. diss." } + +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$ +} + + %------------------------------------------------------------------- + % 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-2011 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$ + 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$ +} + +FUNCTION {format.url} +{ url + duplicate$ empty$ + { pop$ "" } + { "\urlprefix\url{" swap$ * "}" * } + if$ +} + +INTEGERS { nameptr namesleft numnames } + +STRINGS { bibinfo} + +FUNCTION {end.quote.title} +{ title empty$ + 'skip$ + { before.all 'output.state := } + if$ +} + +FUNCTION {format.school} +{school "school" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + "" swap$ * "" * + } + if$ +} + +FUNCTION {format.names} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{f{.}.}{ vv~}{ ll}{ jj}" + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + nameptr #1 + #1 + = + numnames #100 + > and + { "others" 't := + #1 'namesleft := } + 'skip$ + if$ + namesleft #1 > + { ", " * t * } + { + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + numnames #2 > + t "others" = not and + { "," * } + 'skip$ + if$ + t "others" = + { + ", " * bbl.etal emphasize * + } + { + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} + +FUNCTION {format.names.ed} +{ + format.names +} + +FUNCTION {format.key} +{ empty$ + { key field.or.null } + { "" } + if$ +} + +FUNCTION {format.authors} +{ author "author" format.names +} + +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + " " * + get.bbl.editor + "(" swap$ * ")" * + * + } + if$ +} + +FUNCTION {format.noeditors} +{ bbl.edin * "" * +} + +FUNCTION {format.plaineditors} +{ editor "editor" format.names empty$ 'skip$ + { + bbl.edin swap$ * + "" * + get.bbl.editor +%% capitalize + ", " swap$ * "" * * + } + if$ +} + +FUNCTION {format.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + emphasize + } + if$ +} + +FUNCTION {format.inproctitle} +{ title + "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + emphasize + "" swap$ * + ", " * + } + if$ +} + +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 {output.mrnumber} +{ duplicate$ missing$ + { pop$ "" } + 'skip$ + if$ + duplicate$ empty$ + 'pop$ + { " \MR{" swap$ * "}" * write$ } + if$ +} + +FUNCTION {fin.entry} +{ add.period$ + write$ + mrnumber output.mrnumber + newline$ +} + +FUNCTION {word.in} +{ bbl.in + " " * } + +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$ + * + remove.dots + } + if$ + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + " (" swap$ * ")" * + } + if$ +} + +FUNCTION {format.unpubdate} +{ + "" + 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$ + * + remove.dots + } + if$ + duplicate$ empty$ + 'skip$ + { + before.all 'output.state := + ", " swap$ * + } + if$ +} + +FUNCTION{format.year} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + " (" swap$ * ")" * + } + if$ +} + +FUNCTION{format.inprocyear} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + "" swap$ * "" * + } + if$ +} + +FUNCTION {format.inprocdate} +{ year "year" + bibinfo.check + duplicate$ empty$ + { + "empty year in " cite$ * "; set to ????" * warning$ + pop$ "????" + } + 'skip$ + if$ + before.all + ", " swap$ * + 'output.state := + ", " * +} + +FUNCTION {format.intechrdate} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + " " swap$ * "" * + } + if$ +} + +FUNCTION {format.sanspardate} +{ year "year" bibinfo.check duplicate$ empty$ + { "empty year in " cite$ * + warning$ + } + { + " " swap$ * "" * + } + if$ +} + +FUNCTION {format.plaindate} +{ year "year" bibinfo.check duplicate$ empty$ + { + "empty year in " cite$ * "; set to ????" * warning$ + pop$ "????" + } + 'skip$ + if$ + month "month" bibinfo.check duplicate$ empty$ + 'skip$ + { + swap$ + " " * swap$ + } + if$ + * + remove.dots + before.all 'output.state := + ", " swap$ * +} + +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$ + %{ emphasize ", " * swap$ * } + { " " * swap$ * } + 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.number.plainseries} +{ 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$ + { + convert.edition + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + " " * bbl.edition * + } + if$ +} + +FUNCTION {format.translator} +{ +translator "translator" bibinfo.check + " [{\itshape English translation}], " swap$ * bbl.translator * +} + +FUNCTION {format.inprocedition} +{ edition duplicate$ empty$ 'skip$ + { + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + add.blank + " " swap$ " " * 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 multi.page.check + 'bbl.pages + 'bbl.page + if$ + swap$ tie.or.space.prefix + "pages" bibinfo.check + * * + * + } + if$ + } + if$ +} + +FUNCTION {format.journal.eid} +{ eid "eid" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ 'skip$ + { + ", " * + } + if$ + swap$ * + } + if$ +} + +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + format.year * +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + { "" } + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.inprocchapter.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.chaptertitle} +{ + chaptertitle "chaptertitle" bibinfo.check + emphasize +} + +FUNCTION {format.englishtitle} +{ + englishtitle "englishtitle" bibinfo.check + emphasize +} + +FUNCTION {format.trntitle} +{ + trntitle "title" bibinfo.check + emphasize +} + +FUNCTION {format.trnbookedition} +{ edition duplicate$ empty$ 'skip$ + { "edition" bibinfo.check + add.blank ", " swap$ * + "" * + } + if$ +} + +FUNCTION {format.in.ed.booktitle} +{ format.booktitle duplicate$ empty$ 'skip$ + { + editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { + get.bbl.editor + swap$ "," * + " " * swap$ * + swap$ + "," * + " " * 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 + key empty$ not and + { "all relevant fields are empty in " cite$ * warning$ } + 'skip$ + if$ +} + +FUNCTION {format.chapter} +{ chapter empty$ + 'format.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.inchapter} +{ chapter + "chapter" bibinfo.check + duplicate$ empty$ 'skip$ + { + "" swap$ * + ". " * + } + if$ +} + +FUNCTION {format.thesis.type} +{ type duplicate$ empty$ + 'pop$ + { swap$ pop$ + "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 + * + } + { #2 < + 'skip$ + { editor #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + "editor" bibinfo.check + " " * bbl.etal + * + } + { + bbl.and space.word + * 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 + 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 := + "" + address empty$ t empty$ and + 'skip$ + { + t empty$ + { address "address" bibinfo.check * + } + { t * + address empty$ + 'skip$ + { ", " * address "address" bibinfo.check * } + if$ + } + 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.conference.address} +{ address "address" bibinfo.check +} + +FUNCTION {format.month} +{ month empty$ + { "" } + { month "month" bibinfo.check + "" swap$ * "" *} + if$ +} + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.title "title" output.check + crossref missing$ + { + journal + "journal" bibinfo.check + "journal" output.check + add.blank + format.vol.num.pages output + } + { format.article.crossref output.nonnull + } + if$ + eid empty$ + { format.journal.pages } + { format.journal.eid } + if$ + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {book} +{ 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$ + format.btitle "title" output.check + format.edition output + crossref missing$ + { format.bvolume output + format.number.series output + format.publisher.address output + end.quote.title + } + { + format.book.crossref output.nonnull + } + if$ + format.plaindate "year" output.check + date.block + format.url output + note output + fin.entry +} + +FUNCTION {booklet} +{ output.bibitem + format.authors output + format.title "title" output.check + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + format.date output + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.btitle "title" output.check + format.edition output + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.bvolume output + format.chapter.pages "chapter and pages" output.check + format.number.series output + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + new.block + format.book.crossref output.nonnull + } + if$ + format.date "year" output.check + format.pages "pages" output.check + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.edition output + format.bvolume output + format.chapter.pages output + format.number.series output + format.publisher.address output + format.sanspardate "year" output.check + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + format.pages "pages" output.check + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.inproctitle "title" output.check + end.quote.title + crossref missing$ + { format.inprocedition output + format.in.ed.booktitle "booktitle" output.check + format.bvolume output + format.month output% + format.conference.address output% + new.sentence% + organization output% + publisher output% + format.chapter.pages output + format.number.plainseries output + } + { format.incoll.inproc.crossref output.nonnull + } + if$ + format.inprocyear "year" output.check + format.inprocchapter.pages output + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {translatedbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + add.blank + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.plaindate "year" output.check + end.quote.title + format.chaptertitle "chaptertitle" output.check + add.blank + format.trntitle "title" output.check + add.blank + format.englishtitle "englishtitle" output.check + add.blank + format.trnbookedition output + crossref missing$ + { format.bvolume output + format.number.series output + format.publisher.address output + } + { + format.book.crossref output.nonnull + } + if$ + format.url output + note output + fin.entry +} + +FUNCTION {intranslatedbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.btitle "title" output.check + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + end.quote.title + format.translator "translator" output.check + format.bvolume output + format.chapter.pages "chapter and pages" output.check + format.number.series output + format.publisher.address output + } + { + format.chapter.pages "chapter and pages" output.check + new.block + format.book.crossref output.nonnull + } + if$ + format.date "year" output.check + format.pages "pages" output.check + format.url output + note 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$ + format.btitle "title" output.check + author empty$ + { organization empty$ + { + address "address" bibinfo.check output + } + 'skip$ + if$ + } + { + organization "organization" bibinfo.check output + address "address" bibinfo.check output + } + if$ + format.edition output + format.date output + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + bbl.mthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.sanspardate "year" output.check + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + format.title output + howpublished "howpublished" bibinfo.check output + format.date output + new.sentence + format.url output + note output + fin.entry + empty.misc.check +} + +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + bbl.phdthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + format.sanspardate "year" output.check + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {presentation} +{ output.bibitem + format.authors output + format.title output + format.organization.address "organization and address" output.check + format.month output + year output + new.sentence + type missing$ 'skip$ + {"(" type capitalize * ")" * output} + if$ + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + editor empty$ + { organization "organization" bibinfo.check output } + { format.editors output.nonnull } + if$ + format.btitle "title" output.check + format.bvolume output + address empty$ + { editor empty$ + 'skip$ + { organization output } + if$ + publisher output + format.sanspardate "year" output.check + } + { format.month output + format.conference.address output + new.sentence + editor empty$ + 'skip$ + { organization output } + if$ + publisher output + format.sanspardate "year" output.check + } + if$ +% format.date "year" output.check + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + format.tr.number output.nonnull + institution "institution" bibinfo.warn output + address "address" bibinfo.check output + format.intechrdate "year" output.check + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + format.title "title" output.check + format.unpubdate output + journal "journal" bibinfo.check + "journal" output.check + new.sentence + format.url output + note output + fin.entry +} + +FUNCTION {default.type} { misc } + +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{ }}{ ff{ }}{ 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 {author.editor.sort} +{ author empty$ + { 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} +{ author empty$ + { organization empty$ + { key empty$ + { "to sort, need author, organization, or key in " cite$ * warning$ + "" + } + { 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$ + "" + } + { key sortify } + if$ + } + { "The " #4 organization chop.word sortify } + if$ + } + { editor sort.format.names } + if$ +} + +FUNCTION {presort} +{ type$ "book" = + type$ "inbook" = + or + 'author.editor.sort + { type$ "proceedings" = + 'editor.organization.sort + { 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.key$ := +} + +ITERATE {presort} + +SORT + +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{\MR}{\relax\unskip\space MR }" + write$ newline$ + "\providecommand{\url}[1]{\normalfont{#1}}" + write$ newline$ + "\providecommand{\urlprefix}{Available at }" + 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 `tfs.bst'. diff --git a/man/article.Rd b/man/article.Rd index c03ef1e45..5dcc9102d 100644 --- a/man/article.Rd +++ b/man/article.Rd @@ -423,7 +423,7 @@ Macro package for Springer Journals. \section{\code{tf_article}}{ Format for creating submissions to a Taylor & Francis journal. Adapted from -\samp{https://www.tandf.co.uk/journals/authors/InteractCADLaTeX.zip}. +\samp{https://www.tandf.co.uk/journals/authors/InteractLaTeX.zip}, where is one of APA (American Psychological Association), CAD (Chicago Author-Date), NLM (National Library of Medicine), TFP (Reference Style P), TFQ (Reference Style Q), and TFS (Reference Style S). Authors must specify one of these options in the field biblio-style of the YAML header, according to the reference style required by the concerned journal. } \section{\code{trb_article}}{ From 8ecb69ca27adb4ab2f9d47fdf50189c5c4404c7e Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sun, 1 Dec 2024 08:57:00 +0100 Subject: [PATCH 02/29] Cope with absent "biblio-style" field in the YAML header --- R/article.R | 12 ++++++------ 1 file changed, 6 insertions(+), 6 deletions(-) diff --git a/R/article.R b/R/article.R index a51c5e745..94f7092db 100644 --- a/R/article.R +++ b/R/article.R @@ -566,12 +566,12 @@ tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib") { if (is.function(pre_knit_fun)) pre_knit_fun(input, ...) allowed_styles <- c("APA", "CAD", "NLM", "TFP", "TFQ", "TFS") options <- rmarkdown::yaml_front_matter(input) - if (! options[["biblio-style"]] %in% allowed_styles) { - stop(paste( - "Invalid biblio-style in Taylor and Francis article. Allowed values are", - paste(allowed_styles, collapse = ", ") - )) - } + if ("biblio-style" %in% names(options)) + if (! options[["biblio-style"]] %in% allowed_styles) + stop(paste( + "Invalid biblio-style in Taylor and Francis article. Allowed values are", + paste(allowed_styles, collapse = ", ") + )) } format } From a1774b481edba5b223ba6ed25906ef81f94990b2 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sun, 1 Dec 2024 10:18:36 +0100 Subject: [PATCH 03/29] Use pandoc substitution variable bst-name instead of biblio-style * R/article.R: Add option biblio_style (with default value "CAD"), which is used to set the bst-name pandoc substitution variable * inst/rmarkdown/templates/tf/resources/template.tex: - Use variable bst-name - This simplifies the \bibliographystyle command * man/article.Rd: Update documentation for tf_article --- R/article.R | 40 +++++++++++-------- .../templates/tf/resources/template.tex | 33 +++++---------- man/article.Rd | 5 ++- 3 files changed, 37 insertions(+), 41 deletions(-) diff --git a/R/article.R b/R/article.R index 94f7092db..e8e6cdef2 100644 --- a/R/article.R +++ b/R/article.R @@ -556,24 +556,32 @@ springer_article <- function(..., keep_tex = TRUE, citation_package = "natbib", #' \samp{https://www.tandf.co.uk/journals/authors/InteractCADLaTeX.zip}. #' @export #' @rdname article -tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib") { - format <- pdf_document_format( +tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", + biblio_style = "CAD", pandoc_args = NULL) { + styles <- list(APA = "apacite", + CAD = "tfcad", + NLM = "tfnlm", + TFP = "tfp", + TFQ = "tfq", + TFS = "tfs") + if (! biblio_style %in% names(styles)) + stop( + paste( + "Invalid biblio_style in Taylor and Francis article. Allowed values are:", + paste(names(styles), collapse = ", ") + ) + ) + pandoc_args <- c( + pandoc_args, + rmarkdown::pandoc_variable_arg("bst-name", styles[[biblio_style]]) + ) + pdf_document_format( "tf", - keep_tex = keep_tex, citation_package = citation_package, ... + keep_tex = keep_tex, + citation_package = citation_package, + 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, ...) - allowed_styles <- c("APA", "CAD", "NLM", "TFP", "TFQ", "TFS") - options <- rmarkdown::yaml_front_matter(input) - if ("biblio-style" %in% names(options)) - if (! options[["biblio-style"]] %in% allowed_styles) - stop(paste( - "Invalid biblio-style in Taylor and Francis article. Allowed values are", - paste(allowed_styles, collapse = ", ") - )) - } - format } #' @section \code{trb_article}: Format for creating submissions to the Transportation diff --git a/inst/rmarkdown/templates/tf/resources/template.tex b/inst/rmarkdown/templates/tf/resources/template.tex index 2e5e3f234..199421e0e 100644 --- a/inst/rmarkdown/templates/tf/resources/template.tex +++ b/inst/rmarkdown/templates/tf/resources/template.tex @@ -10,27 +10,27 @@ \newcommand{\BiblioStyleErrorMessage}{% \errmessage{% - Invalid biblio-style in Taylor and Francis template. Allowed values are APA, CAD, NLM, TFP, TFQ, and TFS}} + Invalid biblio_style in Taylor and Francis template. Allowed values are APA, CAD, NLM, TFP, TFQ, and TFS}} -\ifstrequal{$biblio-style$}{APA}% +\ifstrequal{$bst-name$}{apacite}% {\usepackage[natbibapa]{apacite}% Citation support using apacite.sty. Commands using natbib.sty MUST be deactivated first! \setlength\bibhang{12pt}% To set the indentation in the list of references using apacite.sty. Commands using natbib.sty MUST be deactivated first! \renewcommand\bibliographytypesize{\fontsize{10}{12}\selectfont}}% To set the list of references in 10 point font using apacite.sty. Commands using natbib.sty MUST be deactivated first! {\ifboolexpr{% - test {\ifstrequal{$biblio-style$}{CAD}}% - or test {\ifstrequal{$biblio-style$}{}}}% Default + test {\ifstrequal{$bst-name$}{tfcad}}% + or test {\ifstrequal{$bst-name$}{}}}% Default {\usepackage{natbib}}% Citation support using natbib.sty {\ifboolexpr{% - test {\ifstrequal{$biblio-style$}{NLM}}% - or test {\ifstrequal{$biblio-style$}{TFQ}}% - or test {\ifstrequal{$biblio-style$}{TFS}}}% + test {\ifstrequal{$bst-name$}{tfnlm}}% + or test {\ifstrequal{$bst-name$}{tfq}}% + or test {\ifstrequal{$bst-name$}{tfs}}}% {\usepackage[numbers,sort&compress]{natbib}% Citation support using natbib.sty - \ifstrequal{$biblio-style$}{NLM}% + \ifstrequal{$bst-name$}{tfnlm}% {\makeatletter% @ becomes a letter \def\NAT@def@citea{\def\@citea{\NAT@separator}}% Suppress spaces between citations using natbib.sty \makeatother} {}}% @ becomes a symbol again - {\ifstrequal{$biblio-style$}{TFP}% + {\ifstrequal{$bst-name$}{tfp}% {\usepackage[numbers,sort&compress,merge]{natbib}% Citation support using natbib.sty \renewcommand\citenumfont[1]{\textit{#1}}% Citation numbers in italic font using natbib.sty \renewcommand\bibnumfmt[1]{(#1)}}% Parentheses enclose ref. numbers in list using natbib.sty @@ -229,20 +229,7 @@ $body$ $if(bibliography)$ -\ifboolexpr{test {\ifstrequal{$biblio-style$}{CAD}} - or test {\ifstrequal{$biblio-style$}{}}}% - {\bibliographystyle{tfcad}}% - {\ifstrequal{$biblio-style$}{APA}% - {\bibliographystyle{apacite}}% - {\ifstrequal{$biblio-style$}{NLM}% - {\bibliographystyle{tfnlm}}% - {\ifstrequal{$biblio-style$}{TFP}% - {\bibliographystyle{tfp}}% - {\ifstrequal{$biblio-style$}{TFQ}% - {\bibliographystyle{tfq}}% - {\ifstrequal{$biblio-style$}{TFS}% - {\bibliographystyle{tfs}}% - {\BiblioStyleErrorMessage}}}}}}% Chigago Author-Date for backward compatibility +\bibliographystyle{$bst-name$} \bibliography{$bibliography$} $endif$ diff --git a/man/article.Rd b/man/article.Rd index 5dcc9102d..098f0ee41 100644 --- a/man/article.Rd +++ b/man/article.Rd @@ -154,7 +154,8 @@ springer_article( pandoc_args = NULL ) -tf_article(..., keep_tex = TRUE, citation_package = "natbib") +tf_article(..., keep_tex = TRUE, citation_package = "natbib", + biblio_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS")) trb_article(..., keep_tex = TRUE, citation_package = "natbib") @@ -423,7 +424,7 @@ Macro package for Springer Journals. \section{\code{tf_article}}{ Format for creating submissions to a Taylor & Francis journal. Adapted from -\samp{https://www.tandf.co.uk/journals/authors/InteractLaTeX.zip}, where is one of APA (American Psychological Association), CAD (Chicago Author-Date), NLM (National Library of Medicine), TFP (Reference Style P), TFQ (Reference Style Q), and TFS (Reference Style S). Authors must specify one of these options in the field biblio-style of the YAML header, according to the reference style required by the concerned journal. +\samp{https://www.tandf.co.uk/journals/authors/InteractLaTeX.zip}, where is one of APA (American Psychological Association), CAD (Chicago Author-Date), NLM (National Library of Medicine), TFP (Reference Style P), TFQ (Reference Style Q), and TFS (Reference Style S). Authors can specify one of these options in the YAML header, according to the reference style required by the concerned journal. } \section{\code{trb_article}}{ From eab22c52125b087a2321312dc73298d9515c98cd Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Mon, 2 Dec 2024 10:44:10 +0100 Subject: [PATCH 04/29] Adapt article sample for all T&F reference styles --- ...teractcadsample.bib => interactsample.bib} | 0 .../templates/tf/skeleton/skeleton.Rmd | 46 ++++++++++++++++--- 2 files changed, 39 insertions(+), 7 deletions(-) rename inst/rmarkdown/templates/tf/skeleton/{interactcadsample.bib => interactsample.bib} (100%) diff --git a/inst/rmarkdown/templates/tf/skeleton/interactcadsample.bib b/inst/rmarkdown/templates/tf/skeleton/interactsample.bib similarity index 100% rename from inst/rmarkdown/templates/tf/skeleton/interactcadsample.bib rename to inst/rmarkdown/templates/tf/skeleton/interactsample.bib diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index 8233d82b7..9d6bb9a2b 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -1,7 +1,7 @@ --- title: | Taylor & Francis Rmarkdown template for authors (\LaTeX\-based - \textsf{Interact} layout + Chicago author-date reference style) + \textsf{Interact} layout) type: ARTICLE TEMPLATE author: - name: A. N. Author @@ -29,12 +29,12 @@ thanks: author: - name: A. N. Author email: latex.helpdesk@tandf.co.uk -bibliography: interactcadsample.bib +bibliography: interactsample.bib appendix: appendix.tex abstract: | This template is for authors who are preparing a manuscript for a Taylor & Francis journal using the \LaTeX\ document preparation system and the - `interact} class file, which is available via selected journals' home + `interact` class file, which is available via selected journals' home pages on the Taylor & Francis website. keywords: | Sections; lists; figures; tables; mathematics; fonts; references; appendices @@ -42,16 +42,18 @@ header-includes: | \usepackage{hyperref} \usepackage[utf8]{inputenc} \def\tightlist{} -output: rticles::tf_article +output: + rticles::tf_article: + biblio_style: CAD --- # Introduction -In order to assist authors in the process of preparing a manuscript for a journal, the Taylor & Francis '\textsf{Interact}' layout style has been implemented as a \LaTeXe\ class file based on the `article` document class. A \textsc{Bib}\TeX\ bibliography style file and a sample bibliography are also provided in order to assist with the formatting of your references. +In order to assist authors in the process of preparing a manuscript for a journal, the Taylor & Francis ‘\textsf{Interact}’ layout style has been implemented as a \LaTeXe\ class file based on the `article` document class. A \textsc{Bib}\TeX\ bibliography style file and a sample bibliography are also provided in order to assist with the formatting of your references. Commands that differ from or are provided in addition to standard \LaTeXe\ are described in this document, which is _not_ a substitute for a \LaTeXe\ tutorial. -The `interactcadsample.tex` file can be used as a template for a manuscript by cutting, pasting, inserting and deleting text as appropriate, using the preamble and the \LaTeX\ environments provided (e.g.\ `\begin{abstract}`, `\begin{keywords}`). +The present file can be used as a template for a manuscript by cutting, pasting, inserting and deleting text as appropriate, using the preamble and the \LaTeX\ environments provided (e.g.\ `\begin{abstract}`, `\begin{keywords}`). ## The \textsf{Interact} class file @@ -85,6 +87,18 @@ To prepare a manuscript for a journal that is printed in A4 (two column) format, ## Title, authors' names and affiliations, abstracts and article types +The title is generated automatically from the information in the YAML header. The `type` field is also provided as an _optional_ element which should _only_ be included if your article actually needs it. + +An additional abstract in another language (preceded by a translation of the article title) may be included within the `abstract` environment if required. + +A graphical abstract may also be included if required. Within the `abstract` environment you can include the code +``` +\\\resizebox{25pc}{!}{\includegraphics{abstract.eps}} + +``` +where the graphical abstract is to appear, where `abstract.eps` is the name of the file containing the graphic (note that `25pc` is the recommended maximum width, expressed in pica, for the graphical abstract in your manuscript). + + ## Abbreviations A list of abbreviations may be included if required, enclosed within an `abbreviations` environment, i.e.\ `\begin{abbreviations}`\ldots`\end{abbreviations}`, immediately following the `abstract` environment. @@ -158,7 +172,7 @@ Bulleted lists are produced using the `itemize` environment. For example, plot(pressure) ``` -The `interact` class file will deal with positioning your figures in the same way as standard \LaTeX. It should not normally be necessary to use the optional `[htb]` location specifiers of the `figure` environment in your manuscript; you may, however, find the `[p]` placement option or the `endfloat` package useful if a journal insists on the need to separate figures from the text. +The `interact` class file will deal with positioning your figures in the same way as standard \LaTeX. It should not normally be necessary to use the optional `[htb]` location specifiers of the `figure` environment in your manuscript; you may, however, find the `[p]` placement option -- i.e. `\begin{figure}[p]` -- or the `endfloat` package useful if a journal insists on the need to separate figures from the text. Figure captions appear below the figures themselves, therefore the `\caption` command should appear after the body of the figure. For example, Figure~\ref{sample-figure} with caption and sub-captions is produced using the following commands: ``` @@ -371,6 +385,24 @@ An unnumbered `Notes` section may be included before the References (if using th # References +Different journals from Taylor & Francis have different requirements for formatting the list of references. The reference style will be one those: + +- American Psychological Association (APA) +- Chicago Author-Date refrence style (CAD) +- National Library of Medicine (NLM) +- Reference Style-P (TFP) +- Reference Style-Q (TFQ) +- Reference Style-S (TFS) + +Authors must specify the required reference style in the YAML header of this file. For instance, this must be included when using the Chicago Author-Date reference style: +``` +output: + rticles::tf_article: + biblio_style: CAD +``` + +[**FIXME: The following two subsections must be adapted for the different reference styles!**] + ## References cited in the text ## The list of references From acec4e67762e871042d0965c064f930dcd774037 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Mon, 2 Dec 2024 17:52:41 +0100 Subject: [PATCH 05/29] Replace tilde ("~") by " " --- inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index 9d6bb9a2b..6f1f398cd 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -174,7 +174,7 @@ plot(pressure) The `interact` class file will deal with positioning your figures in the same way as standard \LaTeX. It should not normally be necessary to use the optional `[htb]` location specifiers of the `figure` environment in your manuscript; you may, however, find the `[p]` placement option -- i.e. `\begin{figure}[p]` -- or the `endfloat` package useful if a journal insists on the need to separate figures from the text. -Figure captions appear below the figures themselves, therefore the `\caption` command should appear after the body of the figure. For example, Figure~\ref{sample-figure} with caption and sub-captions is produced using the following commands: +Figure captions appear below the figures themselves, therefore the `\caption` command should appear after the body of the figure. For example, Figure \ref{sample-figure} with caption and sub-captions is produced using the following commands: ``` \begin{figure} \centering @@ -211,7 +211,7 @@ The `epstopdf` package can be used to incorporate encapsulated PostScript (.eps) The `interact` class file will deal with positioning your tables in the same way as standard \LaTeX. It should not normally be necessary to use the optional `[htb]` location specifiers of the `table` environment in your manuscript; you may, however, find the `[p]` placement option or the `endfloat` package useful if a journal insists on the need to separate tables from the text. -The `tabular` environment can be used as shown to create tables with single horizontal rules at the head, foot and elsewhere as appropriate. The captions appear above the tables in the \textsf{Interact} style, therefore the `\tbl` command should be used before the body of the table. For example, Table~\ref{sample-table} is produced using the following commands: +The `tabular` environment can be used as shown to create tables with single horizontal rules at the head, foot and elsewhere as appropriate. The captions appear above the tables in the \textsf{Interact} style, therefore the `\tbl` command should be used before the body of the table. For example, Table \ref{sample-table} is produced using the following commands: \begin{table} \tbl{Example of a table showing that its caption is as wide as the table itself and justified.} From 11dc4eb5f7fe5f0e0c1ab6196ce0367ec03cd82b Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Mon, 2 Dec 2024 17:56:10 +0100 Subject: [PATCH 06/29] Add the appropriate References section MIME-Version: 1.0 Content-Type: text/plain; charset=UTF-8 Content-Transfer-Encoding: 8bit The “References cited in the text” sections of the Taylor & Francis samples (interactapasample.tex, interactcadsample.tex, interactnlmsample.tex, interacttfpsample.tex, interacttfqsample.tex, and interacttfssample.tex) are merged into the skeleton.Rmd, with each reference style being treated in a separate subsection. Also, the entries in the BibTeX files interactapasample.bib, interactcadsample.bib, interactnlmsample.bib, interacttfpsample.bib, interacttfqsample.bib, and interacttfssample.bib are merged into interactsample.bib. --- .../templates/tf/skeleton/interactsample.bib | 1835 +++++++++++++++++ .../templates/tf/skeleton/skeleton.Rmd | 67 +- 2 files changed, 1889 insertions(+), 13 deletions(-) diff --git a/inst/rmarkdown/templates/tf/skeleton/interactsample.bib b/inst/rmarkdown/templates/tf/skeleton/interactsample.bib index d0c425170..15d917ef7 100644 --- a/inst/rmarkdown/templates/tf/skeleton/interactsample.bib +++ b/inst/rmarkdown/templates/tf/skeleton/interactsample.bib @@ -1,3 +1,370 @@ +@PHDTHESIS{Adams1973, + author = {Adams, R. J.}, + year = 1973, + title = {Building a Foundation for Evaluation of Instruction in Higher Education and Continuing Education}, + type = {Doctoral dissertation}, + url = {http://www.ohiolink.edu/etd/}} + +@BOOK{APA10, + author = {{American Psychological Association}}, + year = 2010, + title = {Publication Manual of the {A}merican {P}sychological {A}ssociation}, + edition = {6}, + address = {Washington, DC}, + publisher = {Author}} + +@BOOK{Ban77, + author = {Bandura, A. J.}, + year = 1977, + title = {Social Learning Theory}, + address = {Englewood Cliffs, NJ}, + publisher = {Prentice Hall}} + +@ARTICLE{Bar91, + editor = {Barlow, D. H.}, + year = 1991, + title = {Diagnoses, Dimensions, and {DSM-IV} [{S}pecial issue]}, + journal = {Journal of Abnormal Psychology}, + volume = 100, + number = 3} + +@ARTICLE{BriIP, + author = {Briscoe, R.}, + year = {in press}, + title = {Egocentric Spatial Representation in Action and Perception}, + journal = {Philosophy and Phenomenological Research}, + url = {http://cogprints.org/5780/1/ECSRAP.F07.pdf}} + +@NEWSPAPER{Bro07, + author = {Brody, J. E.}, + year = 2007, + month = dec # "~11", + title = {Mental Reserves Keep Brain Agile}, + journal = {The New York Times}, + url = {http://www.nytimes.com}} + +@ARTICLE{Cha08, + author = {Chamberlin, J. and Novotney, A. and Packard, E. and Price, M.}, + year = 2008, + month = may, + title = {Enhancing Worker Well-Being: Occupational Health Psychologists Convene to Share their Research on Work, Stress, and Health}, + journal = {Monitor on Psychology}, + volume = 39, + number = 5, + pages = {26--29}} + +@ARTICLE{Cla08, + author = {Clay, R.}, + year = 2008, + month = jun, + title = {Science vs. Ideology: Psychologists Fight Back about the Misuse of Research}, + journal = {Monitor on Psychology}, + volume = 39, + number = 6, + url = {http://www.apa.org/monitor/}} + +@ARTICLE{Edi06, + key = {Editorial}, + title = {Editorial: ``{W}hat is a Disaster'' and Why does this Question Matter?}, + type = {Editorial}, + year = 2006, + journal = {Journal of Contingencies and Crisis Management}, + volume = 14, + pages = {1--2}} + +@TECHREPORT{EBRI92, + author = {{Employee Benefit Research Institute}}, + year = 1992, + month = feb, + title = {Sources of Health Insurance and Characteristics of the Uninsured}, + type = {Issue Brief}, + number = {123}, + address = {Washington, DC}, + institution = {{Employee Benefit Research Institute}}} + +@TECHREPORT{Fel81, + author = {B. A. Feller}, + title = {Health Characteristics of Persons with Chronic Activity Limitation, {U}nited {S}tates, 1979}, + address = {Hyattsville, MD}, + institution = {National Center for Health Statistics (US)}, + year = 1981, + type = {Report}, + number = {VHS-SER10/137}} + +@ARTICLE{GSSM91, + author = {Ganster, D. C. and Schaubroeck, J. and Sime, W. E. and Mayes, B. T.}, + year = 1991, + title = {The Nomological Validity of the {Type A} Personality Among Employed Adults}, + type = {Monograph}, + journal = {Journal of Applied Psychology}, + volume = 76, + pages = {143--168}} + +@ARTICLE{Gil04, + author = {Gilbert, David G. and McClernon, F. Joseph and Rabinovich, Norka E. and Chihiro Sugai and Louisette C. Plath and Greg Asgaard and Yantao Zuo and Jodi Huggenvik and Nazeih Botros}, + year = 2004, + title = {Effects of quitting smoking on {EEG} activation and attention last for more than 31 days and are more severe with stress, dependence, {DRD2 A1} allele, and depressive traits}, + journal = {Nicotine and Tobacco Research}, + volume = 6, + pages = {249--267}, + doi = {10.1080/14622200410001676305}} + +@INCOLLECTION{Gra05, + author = {Graham, G.}, + year = 2005, + title = {Behaviorism}, + editor = {E. N. Zalta}, + booktitle = {The {S}tanford Encyclopedia of Philosophy}, + edition = {Fall 2007}, + url = {http://plato.stanford.edu/entries/behaviorism}} + +@ARTICLE{Gre06, + editor = {Greenfield, P. and Yan, Z.}, + year = 2006, + title = {Children, Adolescents, and the {I}nternet}, + type = {Special section}, + journal = {Developmental Psychology}, + volume = 42, + pages = {391--458}} + +@ARTICLE{Gui07, + author = {Guimard, P. and Florin, A.}, + title = {Les {\'e}valuations des enseignants en grande section de maternelle sont-elles pr{\'e}dictives des difficult{\'e}s de lecture au cours pr{\'e}paratoire?}, + englishtitle = {Are teacher ratings in kindergarten predictive of reading difficulties in first grade?}, + journal = {Approche Neuropsychologique des Apprentissages chez l'Enfant}, + year = 2007, + volume = 19, + pages = {5--17}} + +@ARTICLE{Han04, + editor = {Haney, C. and Wiener, R. L.}, + year = 2004, + title = {Capital Punishment in the {U}nited {S}tates}, + type = {Special issue}, + journal = {Psychology, Public Policy, and Law}, + volume = 10, + number = 4} + +@INCOLLECTION{Hay08, + author = {D. M. Haybron}, + year = 2008, + title = {Philosophy and the Science of Subjective Well-being}, + editor = {M. Eid and R. J. Larsen}, + booktitle = {The Science of Subjective Well-being}, + pages = {17--43}, + address = {New York, NY}, + publisher = {Guilford Press}} + +@ARTICLE{HDK05, + author = {Herbst-Damm, K. L. and Kulik, J. A.}, + year = 2005, + title = {Volunteer Support, Marital Status, and the Survival Times of Terminally Ill Patients}, + journal = {Health Psychology}, + volume = 24, + pages = {225--229}} + +@ARTICLE{Jan76, + author = {Janet, Paul}, + year = 1876, + title = {La notion de la personnalit{\'e}}, + englishtitle = {The Notion of Personality}, + journal = {Revue Scientifique}, + volume = 10, + pages = {574--575}} + +@ARTICLE{Jan06, + author = {Janet, Pierre}, + year = 1906, + title = {The Pathogenesis of Some Impulsions}, + journal = {Journal of Abnormal Psychology}, + volume = 1, + pages = {1--17}} + +@INCOLLECTION{KGA07, + author = {I. Katz and K. Gabayan and H. Aghajan}, + year = 2007, + title = {A Multi-touch Surface Using Multiple Cameras}, + editor = {J. Blanc-Talon and W. Philips and D. Popescu and P. Scheunders}, + booktitle = {Lecture Notes in Computer Science: Vol. 4678. {A}dvanced Concepts for Intelligent Vision Systems}, + pages = {97--108}, + address = {Berlin}, + publisher = {Springer-Verlag}} + +@TECHREPORT{Kes06, + author = {Kessy, S. S. A. and Urio, F. M.}, + year = 2006, + title = {The Contribution of Microfinance Institutions to Poverty Reduction in {T}anzania}, + type = {Research Report}, + number = {06.3}, + institution = {}, + URL = {\textrm{Research on Poverty Alleviation website:} http://www.repoa.or.tz/documents\_storage/Publications/Reports/06.3\_Kessy\_and\_Urio.pdf}} + +@BOOK{Koc59, + editor = {S. Koch}, + year = {1959--1963}, + title = {Psychology: A Study of Science}, + volume = {1--6}, + address = {New York, NY}, + publisher = {McGraw-Hill}} + +@INPROCEEDINGS{Lee03, + author = {D. J. Lee and D. Bates and C. Dromey and X. Xu and S. Antani}, + title = {An Imaging System Correlating Lip Shapes with Tongue Contact Patterns for Speech Pathology Research}, + editor = {M. Krol and S. Mitra and D. J. Lee}, + booktitle = {{CMBS} 2003. {P}roceedings of the 16th {IEEE} Symposium on Computer-Based Medical Systems}, + month = jun, + year = 2003, + pages = {307--313}, + publisher = {Los Alamitos, CA: IEEE Computer Society}} + +@BOOK{Lig06, + author = {Light, I.}, + year = 2006, + title = {Deflecting Immigration: Networks, Markets, and Regulation in {L}os {A}ngeles}, + address = {New York, NY}, + publisher = {Russell Sage Foundation}} + +@ARTICLE{Lig08, + author = {Light, M. A. and Light, I. H.}, + year = 2008, + title = {The Geographic Expansion of {M}exican Immigration in the {U}nited {S}tates and its Applications for Local Law Enforcement}, + journal = {Law Enforcement Executive Forum Journal}, + volume = 8, + number = 1, + pages = {73--82}} + +@PRESENTATION{Liu05, + author = {Liu, S.}, + year = 2005, + title = {Defending against business crises with the help of intelligent agent based early warning solutions}, + howpublished = {Paper presented at the Seventh International Conference on Enterprise Information Systems, Miami, FL}, + month = may} + +@MASTERSTHESIS{McN06, + author = {McNiel, D. S.}, + year = 2006, + title = {Meaning Through Narrative: A Personal Narrative Discussing Growing Up with an Alcoholic Mother}, + note = {Available from ProQuest Dissertations and Theses database. (UMI No. 1434728)}} + +@ARTICLE{MPW08, + author = {Marshall-Pescini, S. and Whiten, A.}, + year = 2008, + title = {Social Learning of Nut-Cracking Behavior in {E}ast {A}frican Sanctuary-Living Chimpanzees (\emph{{P}an troglodytes schweinfurthii})}, + type = {Supplemental material}, + journal = {Journal of Comparative Psychology}, + volume = 122, + pages = {186--194}} + +@INCOLLECTION{Nas93, + author = {Nash, M.}, + year = 1993, + title = {Malay}, + editor = {P. Hockings}, + booktitle = {Encyclopedia of World Cultures}, + volume = 5, + pages = {174--176}, + address = {New York, NY}, + publisher = {G.~K. Hall}} + +@MASTERSTHESIS{Ovi95, + author = {S. Oviedo}, + title = {Adolescent Pregnancy: Voices Heard in the Everyday Lives of Pregnant Teenagers}, + type = {Unpublished master's thesis}, + school = {University of North Texas}, + address = {Denton, TX}, + year = 1995} + +@INCOLLECTION{Pia88, + author = {Piaget, J.}, + year = 1988, + title = {Extracts from {P}iaget's Theory}, + translator = {G. Gellerier and J. Langer}, + editor = {K. Richardson and S. Sheldon}, + booktitle = {Cognitive Development to Adolescence: A Reader}, + pages = {3--18}, + address = {Hillsdale, NJ}, + publisher = {Erlbaum}, + note = {Reprinted from \emph{Manual of child psychology}, pp. 703--732, by P.~H. Mussen, Ed., 1970, New York, NY: Wiley}} + +@BOOK{PI51, + author = {Piaget, J. and Inhelder, B.}, + year = 1951, + title = {La gen{\`e}se de l'id{\'e}e de hasard chez l'enfant [{T}he Origin of the Idea of Chance in the Child]}, + address = {Paris}, + publisher = {Presses Universitaires de France}} + +@BOOK{REA01, + author = {{Real Academia Espa{\~n}ola}}, + year = 2001, + title = {Diccionario de la lengua espa{\~n}ola}, + englishtitle = {Dictionary of the {S}panish Language}, + edition = 22, + address = {Madrid}, + publisher = {{Real Academia Espa{\~n}ola}}} + +@PHDTHESIS{Rit74, + author = {R. E. Ritzmann}, + title = {The Snapping Mechanism of \emph{Alpheid} Shrimp}, + address = {Charlottesville, VA}, + school = {University of Virginia}, + year = 1974} + +@ARTICLE{Sch00, + author = {Schatz, B. R.}, + year = 2000, + month = nov # "~17", + title = {Learning by Text or Context? [{Review of the book \emph{The social life of information}, by J.~S. Brown \& P. Duguid}]}, + journal = {Science}, + volume = 290, + pages = 1304} + +@NEWSPAPER{Sch93, + author = {Schwartz, J.}, + year = 1993, + month = sep # "~30", + title = {Obesity Affects Economic, Social Status}, + journal = {The Washington Post}, + pages = {A1, A4}} + +@ARTICLE{Sil06, + author = {Sillick, T. J. and Schutte, N. S.}, + year = 2006, + title = {Emotional Intelligence and Self-Esteem Mediate between Perceived Early Parental Love and Adult Happiness}, + journal = {E-Journal of Applied Psychology}, + volume = 2, + number = 2, + pages = {38--48}, + url = {http://ojs.lib.swin.edu.au/index.php/ejap}} + +@BOOK{Tho02, + editor = {N. Thomas}, + title = {Perspectives on the Community College: A Journey of Discovery}, + type = {Monograph}, + url = {http://eric.ed.gov/}, + year = 2002} + +@BOOK{VdB07, + editor = {VandenBos, G. R.}, + year = 2007, + title = {{APA} Dictionary of Psychology}, + address = {Washington, DC}, + publisher = {American Psychological Association}} + +@ARTICLE{VL07, + author = {Von Ledebur, S. C.}, + year = 2007, + title = {Optimizing Knowledge Transfer by New Employees in Companies}, + journal = {Knowledge Management Research \& Practice}, + howpublished = {Advance online publication. doi:10.1057/palgrave/kmrp.8500141}} + +@ARTICLE{Woo91, + author = {Woolf, N. J. and Young, S. L. and Fanselow, M. S. and Butcher, L. L.}, + year = 1991, + title = {{MAP}-2 Expression in Cholinoceptive Pyramidal Cells of Rodent Cortex and Hippocampus is Altered by {P}avlovian Conditioning [{A}bstract]}, + journal = {Society for Neuroscience Abstracts}, + volume = 17, + pages = 480} + @ARTICLE{Alb05, author = {Albiston, Catherine R.}, year = 2005, @@ -17,3 +384,1471 @@ @ARTICLE{Blair1977 number = 2, pages = {331--349}, doi = {10.1086/447940}} + +@BOOK{Bro02, + author = {Brooks, Daniel R. and McLennan, Deborah A.}, + title = {The Nature of Diversity: An Evolutionary Voyage of Discovery}, + address = {Chicago}, + publisher = {University of Chicago Press}, + year = 2002} + +@BOOK{Bro86, + author = {Brooks, Daniel R. and Wiley, E. O.}, + title = {Evolution as Entropy}, + edition = {Second}, + address = {Chicago}, + publisher = {University of Chicago Press}, + year = 1986} + +@PRESENTATION{Bunn2018, + author = {Bunn, Matthew and Anna Bennett and Penny Jane Burke}, + year = 2018, + title = {Temporalities of Trust and Betrayal: Teaching and Learning in the Neoliberal University}, + organization = {Paper presented at the Society for Research in Higher Education Annual Research Conference}, + month = dec, + address = {Newport, UK}} + +@PHDTHESIS{Cho08, + author = {Choi, Mihwa}, + year = 2008, + title = {Contesting \emph{Imaginaires} in Death Rituals during the Northern {S}ong Dynasty}, + school = {University of Chicago}, + url = {http://pi.lib.uchicago.edu/1001/cat/bib/6820707}} + +@ARTICLE{ChoGul08, + author = {Choi, Stephen J. and Gulati, G. Mitu}, + year = 2008, + title = {Bias in Judicial Citations: A Window into the Behavior of Judges?}, + journal = {Journal of Legal Studies}, + volume = 37, + number = {1}, + pages = {87--129}, + doi = {10.2139/ssrn.913663}} + +@INCOLLECTION{Draper1987, + author = {Draper, Joan E.}, + year = 1987, + title = {Paris by the Lake: Sources of {B}urnham's Plan of {C}hicago}, + booktitle = {Chicago Architecture, 1872--1922: Birth of a Metropolis}, + editor = {John Zukowsky}, + pages = {107--119}, + address = {Munich}, + publisher = {Prestel-Verlag in association with the Art Institute of Chicago}} + +@ARTICLE{Edelman1992, + author = {Lauren B. Edelman}, + title = {Legal Ambiguity and Symbolic Structures: Organizational Mediation of Civil Rights Law}, + journal = {American Journal of Sociology}, + year = 1992, + volume = 97, + number = 6, + pages = {1531--1576}, + doi = {10.1086/229939}} + +@ARTICLE{EdelmanFullerMara2001, + author = {Lauren B. Edelman and Sally Riggs Fuller and Iona Mara-Drita}, + title = {Diversity Rhetoric and the Managerialization of the Law}, + journal = {American Journal of Sociology}, + year = 2001, + volume = 106, + number = 6, + pages = {1589--1641}, + doi = {10.1086/321303}} + +@ARTICLE{EdelmanUggenErlanger1999, + author = {Lauren B. Edelman and Christopher Uggen and Howard S. Erlanger}, + title = {The Endogeneity of Legal Regulation: Grievance Procedures as Rational Myth}, + journal = {American Journal of Sociology}, + year = 1999, + volume = 105, + number = 2, + pages = {406--454}, + doi = {10.1086/210316}} + +@INCOLLECTION{Ell1968, + author = {Ellet, Elizabeth F. L.}, + title = {By Rail and Stage to Galena}, + booktitle = {Prairie State: Impressions of {I}llinois, 1673--1967, by Travelers and Other Observers}, + editor = {Paul M. Angle}, + pages = {271--279}, + address = {Chicago}, + publisher = {University of Chicago Press}, + year = 1968} + +@BOOK{FogEHPD04, + author = {Robert William Fogel}, + year = 2004, + title = {The Escape from Hunger and Premature Death, 1700--2100: {E}urope, {A}merica, and the {T}hird {W}orld}, + address = {New York}, + publisher = {Cambridge University Press}} + +@ARTICLE{FogJEE04, + author = {Fogel, Robert William}, + title = {Technophysio Evolution and the Measurement of Economic Growth}, + journal = {Journal of Evolutionary Economics}, + year = 2004, + volume = 14, + number = 2, + pages = {217--221}, + doi = {10.1007/s00191-004-0188-x}} + +@BOOK{Fow89, + author = {Fowler, Melvin L.}, + title = {The {C}ahokia Atlas: A Historical Atlas of {C}ahokia Archaeology}, + publisher = {Illinois Historic Preservation Agency}, + address = {Springfield}, + series = {Studies in Illinois Archaeology}, + number = 6, + year = 1989} + +@INCOLLECTION{Gould1984, + author = {Gould, Glenn}, + year = 1984, + title = {Streisand as {S}chwarzkopf}, + booktitle = {The {G}lenn {G}ould Reader}, + editor = {Tim Page}, + pages = {308--311}, + address = {New York}, + publisher = {Vintage}} + +@BOOK{Gre08, + editor = {Greenberg, Joel}, + year = 2008, + title = {Of Prairie, Woods, and Water: Two Centuries of {C}hicago Nature Writing}, + address = {Chicago}, + publisher = {University of Chicago Press}} + +@INCOLLECTION{Harrington1987, + author = {Harrington, Elaine}, + year = 1987, + title = {International Influences on {H}enry {H}obson {R}ichardson's {G}lessner {H}ouse}, + booktitle = {Chicago Architecture, 1872--1922: Birth of a Metropolis}, + editor = {John Zukowsky}, + pages = {189--207}, + address = {Munich}, + publisher = {Prestel-Verlag in association with the Art Institute of Chicago}} + +@ONLINE{HarrisZucker2015, +author = {Harris, Beth and Steven Zucker}, +year = 2015, +title = {Haussmann the Demolisher and the Creation of Modern Paris}, +organization = {Smarthistory}, +url = {https://smarthistory.org/haussmann-the-demolisher-and-the-creation-of-modern-paris}} + +@BOOK{Heinrich2008, + author = {Heinrich, Larissa}, + year = 2008, + title = {The Afterlife of Images: Translating the Pathological Body between {C}hina and the {W}est}, + address = {Durham, NC}, + publisher = {Duke University Press}} + +@BOOK{Jacobs1997, + editor = {Jacobs, Sue-Ellen and Wesley Thomas and Sabine Lang}, + title = {Two-Spirit People: {N}ative {A}merican Gender Identity, Sexuality, and Spirituality}, + address = {Urbana}, + publisher = {University of Illinois Press}, + year = 1997} + +@INCOLLECTION{Kelly2010, + author = {Kelly, John D.}, + year = 2010, + title = {Seeing Red: {M}ao Fetishism, {P}ax {A}mericana, and the Moral Economy of War}, + booktitle = {Anthropology and Global Counterinsurgency}, + editor = {John D. Kelly and Beatrice Jauregui and Sean T. Mitchell and Jeremy Walton}, + pages = {67--83}, + address = {Chicago}, + publisher = {University of Chicago Press}} + +@BOOK{Kogan1974, + author = {Kogan, Herman}, + title = {The First Century: The {C}hicago {B}ar {A}ssociation, 1874--1974}, + address = {Chicago}, + publisher = {Rand McNally}, + year = 1974} + +@BOOK{KoganWendt1958, + author = {Kogan, Herman and Wendt, Lloyd}, + title = {Chicago: A Pictorial History}, + address = {New York}, + publisher = {Dutton}, + year = 1958} + +@BOOK{Lev05, + author = {Levitt, Steven D. and Stephen J. Dubner}, + title = {Freakonomics: A Rogue Economist Explores the Hidden Side of Everything}, + address = {New York}, + publisher = {William Morrow}, + year = 2005} + +@ARTICLE{Mno79, + author = {Mnookin, Robert and Lewis Kornhauser}, + title = {Bargaining in the Shadow of the Law: The Case of Divorce}, + journal = {Yale Law Journal}, + year = 1979, + volume = 88, + number = 5, + pages = {950--997}, + doi = {10.2307/795824}} + +@ARTICLE{Mor08, + author = {Morasse, S{\'e}bastien and Helga Guderley and Julian J. Dodson}, + title = {Paternal Reproductive Strategy Influences Metabolic Capacities and Muscle Development of {A}tlantic Salmon (\emph{Salmo salar} L.) Embryos}, + journal = {Physiological and Biochemical Zoology}, + year = 2008, + volume = 81, + number = 4, + pages = {402--413}, +doi = {10.1086/589012}} + +@ARTICLE{Nowacki20, + author = {Nowacki, J. S. and D. Creech and M. Parks}, + year = 2020, + title = {Political Climate, Voter Suppression Policies and Federal Sentencing Outcomes}, + journal = {British Journal of Criminology}, + volume = 60, + number = 5, + pages = {1115--1180}, + doi = {10.1093/bjc/azaa017}} + +@BOOK{Pelikan1971, + author = {Pelikan, Jaroslav}, + title = {The Emergence of the Catholic Tradition (100--600)}, + volume = {1}, + series = {The {C}hristian Tradition: A History of the Development of Doctrine}, + address = {Chicago}, + publisher = {University of Chicago Press}, + year = 1971} + +@INCOLLECTION{Piaget1995, + author = {Piaget, Jean}, + year = 1995, + title = {Logical Operators and Social Life}, + translator = {Wolfe Mays}, + booktitle = {Sociological Studies}, + editor = {Leslie Smith}, + pages = {134--157}, + address = {Hove, UK}, + publisher = {Routledge}} + +@BOOK{Pollan2006, + author = {Pollan, Michael}, + year = 2006, + title = {The Omnivore's Dilemma: A Natural History of Four Meals}, + address = {New York}, + publisher = {Penguin}} + +@ARTICLE{Prinzie09, + author = {Prinzie, Peter and Geert Jan J. M. Stams and Maja Dekovi{\'c} and Albert H. A. Reijntjes and Jay Belsky}, + year = 2009, + title = {The Relations between Parents' Big Five Personality Factors and Parenting: A Meta-analytic Review}, + journal = {Journal of Personality and Social Psychology}, + volume = 97, + number = 2, + pages = {351--362}, + doi = {10.1037/a0015823}} + +@ARTICLE{Sch87, + author = {Schuman, Howard and Jacqueline Scott}, + year = 1987, + title = {Problems in the Use of Survey Questions to Measure Public Opinion}, + journal = {Science}, + volume = 236, + number = 4804, + pages = {957--959}, + doi = {10.1126/science.236.4804.957}} + +@ARTICLE{Sch89, + author = {Schuman, Howard and Jacqueline Scott}, + year = 1989, + title = {Generations and Collective Memories}, + journal = {American Sociological Review}, + volume = 54, + number = 3, + pages = {359--381}, + doi = {10.2307/2095611}} + +@BOOK{Sol99, + editor = {Soltes, Ori Z.}, + year = 1999, + title = {Georgia: Art and Civilization through the Ages}, + address = {London}, + publisher = {Philip Wilson}} + +@UNPUBLISHED{Stearns1864, + author = {Stearns, A. A.}, + title = {Armory {S}quare {H}ospital Nursing Diary}, + year = 1864, + note = {MS B 372. History of Medicine Division. National Library of Medicine, Bethesda, MD}} + +@BOOK{Str00, + author = {Strunk, Jr., William and E. B. White}, + title = {The Elements of Style}, + edition = {4th}, + address = {New York}, + publisher = {Allyn and Bacon}, + year = 2000} + +@BOOK{VanWagenen1973, + author = {Van Wagenen, Gertrude and Miriam E. Simpson}, + title = {Postnatal Development of the Ovary in \emph{Homo sapiens} and \emph{Macaca mulatta} and Induction of Ovulation in the Macaque}, + address = {New Haven, CT}, + publisher = {Yale University Press}, + year = 1973} + +@PRESENTATION{Wagmiller18, + author = {Wagmiller, R. L. and K. LaParo and D. Schrider and R, Wildfeuer and M. Ford and S. M. Hitchcock}, + year = 2018, + title = {Attitudes towards Interracial Marriage in a Diverse and Unequal Metropolis: A Lost Letter Study}, + organization = {Poster presented at the American Sociological Association 113th Annual Meeting}, + month = aug, + address = {Philadelphia, PA}} + +@BOOK{Wau50, + author = {Robert Wauchope}, + title = {A Tentative Sequence of Pre-Classic Ceramics in Middle {A}merica}, + publisher = {Tulane University}, + year = 1950, + volume = 1, + series = {Middle {A}merican Research Records}, + address = {New Orleans, LA}} + +@BOOK{Weber2020, + author = {Weber, Max}, + title = {Politik als Beruf \emph{[Politics as vocation]}}, + edition = {11th}, + address = {Berlin}, + publisher = {Duncker \& Humblot}, + year = {2010}} + +@BOOK{Wei02, + author = {Weigel, Detlef and Jane Glazebrook}, + title = {Arabidopsis: A Laboratory Manual}, + address = {Cold Spring Harbor, NY}, + publisher = {Cold Spring Harbor Laboratory Press}, + year = 2002} + +@BOOK{Wittgenstein2009, + author = {Wittgenstein, Ludwig}, + title = {Philosophical Investigations}, + translator = {Anscombe, G. E. M. and P. M. S. Hacker and Joachim Schulte}, + edition = {4th}, + address = {Oxford}, + publisher = {Wiley--Blackwell}, + year = 2009} + +@BOOK{Woodward1977, + author = {David Woodward}, + title = {The All-{A}merican Map: Wax Engraving and Its Influence on Cartography}, + publisher = {University of Chicago Press}, + address = {Chicago}, + year = 1977} + +@BOOK{Woodward1987, + editor = {David Woodward}, + title = {Art and Cartography: Six Historical Essays}, + publisher = {University of Chicago Press}, + address = {Chicago}, + year = 1987} + +@BOOK{Woodward1996, + author = {David Woodward}, + title = {Catalogue of Watermarks in {I}talian Printed Maps, ca.~1540--1600}, + publisher = {University of Chicago Press}, + address = {Chicago}, + year = 1996} + + +@ARTICLE{ADA03, + author = {{American Diabetes Association}}, + title = {Diabetes Update}, + journal = {Nursing}, + year = 2003, + month = nov, + volume = {Suppl}, + pages = {19--20, 24}} + +@BOOK{AG98, + editor = {S. V. Ambudkar and M. M. Gottesman}, + title = {{ABC} Transporters: Biomedical, Cellular, and Molecular Aspects}, + publisher = {Academic Press}, + address = {San Diego (CA)}, + year = 1998, + volume = 292, + series = {Methods in enzymology}} + +@PRESENTATION{Ant03, + author = {Antani, S. and Long, L. R. and Thoma, G. R. and Lee, D. J.}, + title = {Anatomical Shape Representation in Spine X-ray Images. {P}aper presented at: {VIIP 2003}. {P}roceedings of the 3rd {IASTED} {I}nternational {C}onference on {V}isualization, {I}maging and {I}mage {P}rocessing}, + month = {2003 Sep~8--10}, + address = {Benalmadena, Spain}} + +@INPROCEEDINGS{Are05, + author = {Arendt, T.}, + title = {Alzheimer's Disease as a Disorder of Dynamic Brain Self-Organization}, + editor = {van Pelt, J. and Kamermans, M. and Levelt, C. N. and van Ooyen, A. and Ramakers, G. J. and Roelfsema, P. R.}, + booktitle = {Development, dynamics, and pathology of neuronal networks: from molecules to functional circuits. Proceedings of the 23rd International Summer School of Brain Research}, + month = {2003 Aug~25--29}, + organization = {Royal Netherlands Academy of Arts and Sciences}, + address = {Amsterdam, the Netherlands}, + publisher = {Amsterdam (Netherlands): Elsevier}, + year = 2005, + pages = {355--378}} + +@BOOK{Ber01, + editor = {Bergstresser, P. R. and Takashima, A.}, + title = {Gamma-delta T cells}, + address = {New York (NY)}, + publisher = {Karger}, + year = 2001, + series = {Chemical immunology}, + volume = 79} + +@ARTICLE{BGC04, + author = {Berrino, F. and Gatta, G. and Crosignani, P.}, + year = 2004, + title = {[{C}ase-control Evaluation of Screening Efficacy]}, + journal = {Epidemiol. Prev.}, + volume = 28, + pages = {354--359}, + note = {Italian}} + +@ARTICLE{Bla89, + author = {Black, H. R.}, + title = {Evaluation of the Elderly Hypertensive}, + journal = {Geriatrics}, + year = 1989, + volume = {44 Suppl B}, + pages = {15--19}} + +@BOOK{Bra04, + editor = {Bradley, W. G. and Daroff, R. B. and Fenichel, G. M. and Jankovic, J.}, + title = {Neurology in Clinical Practice}, + publisher = {Butterworth-Heinemann}, + year = 2004, + volume = {1, Principles of diagnosis and management}, + address = {Philadelphia (PA)}, + edition = {Fourth}} + +@MANUAL{CEN05, + author = {{European Committee for Electrotechnical Standardization (CENELEC)}}, + title = {Measurement and Assessment of Personal Exposures to Incoherent Optical Radiation -- Part 2: Visible and Infrared Radiation Emitted by Artificial Sources in the Workplace}, + address = {Brussels}, + organization = {CENELEC}, + year = 2005, + note = {Standard No. EN 14255-2:2005}} + +@PRESENTATION{Cha06, + author = {Chasman, J. and Kaplan, R. F.}, + title = {The effects of occupation on preserved cognitive functioning in dementia. Poster session presented at: Excellence in clinical practice. 4th Annual Conference of the American Academy of Clinical Neuropsychology}, + month = {2006 Jun~15--17}, + address = {Philadelphia, PA}} + +@INPROCEEDINGS{deT98, + author = {de The, G.}, + title = {Les priorit{\'e}s de sant{\'e} dans les pays en d{\'e}veloppement}, + booktitle = {Colloque Energie Solaire et Sant{\'e} dans les Pays en D{\'e}veloppement = Conference on Solar Energy and Health Care in Developing Countries}, + month = {1991 Nov~4--7}, + address = {Paris}, + publisher = {London: Tec \& Doc}, + year = {c1998}, + pages = {19--29}, + note = {French}} + +@PROCEEDINGS{DCK03, + editor = {Dostorovsky, J. O. and Carr, D. B. and Koltzenburg, M.}, + title = {Proceedings of the 10th World Congress on Pain}, + month = {2002 Aug~17--22}, + address = {San Diego, CA}, + publisher = {Seattle (WA): IASP Press}, + year = 2003} + +@ARTICLE{ElP05, + title = {La ``gripe del pollo'' vuela can las aves silvestres [{T}he ``bird flu'' flies with the wild birds]}, + journal = {El Pais (Madrid) (Ed. Europa)}, + year = 2005, + month = jul # "~17", + pages = {28 (col.~1)}, + note = {Spanish}} + +@BOOK{Eva04, + editor = {Evans, L. K. and Lang, N. M.}, + title = {Academic Nursing Practice}, + address = {New York (NY)}, + publisher = {Springer}, + year = {c2004}, + series = {Springer series on the teaching of nursing}} + +@BOOK{Fla04, + author = {{Flaws B, translator}}, + title = {The Classic of Difficulties: A Translation of the {N}an {J}ing}, + edition = {Third}, + address = {Boulder (CO)}, + publisher = {Blue Poppy Press}, + year = 2004} + +@ARTICLE{FM97, + title = {Neue {N}ifedipin-{Z}ubereitung erm{\"o}glicht t{\"a}gliche {E}inmalgabe [{N}ew nifedipine preparation makes single daily dose possible]}, + journal = {Fortschr. Med.}, + year = 1997, + month = nov # "~30", + volume = 115, + number = 33, + pages = {[following p. 54]}, + note = {German}} + +@BOOK{FBW04, + title = {Models and Perspectives in Health Psychology}, + publisher = {American Psychological Association}, + year = 2004, + editor = {Frank, R. G and Baum, A. and Wallander, J. L.}, + volume = 3, + series = {Boll TJ, editor. Handbook of clinical health psychology}, + address = {Washington (DC)}} + +@ARTICLE{Gau05, + author = {Gaul, G.}, + title = {When Geography Influences Treatment Options}, + journal = {Washington Post (Maryland Ed.)}, + year = 2005, + month = jul # "~24", + note = {Sect.~A:12 (col.~1)}} + +@ARTICLE{HN05, + title = {Pelvic Floor Exercise Can Reduce Stress Incontinence}, + journal = {Health News}, + year = 2005, + volume = 11, + number = 4, + pages = {11}} + +@INPROCEEDINGS{Hor98, + author = {Horrobin, D. F. and Lampinskas, P.}, + title = {The commercial development of food plants used as medicines}, + editor = {Prendergast, H. D. and Etkin, N. L. and Harris, D. R. and Houghton, P. J.}, + booktitle = {Plants for food and medicine. Proceedings of the Joint Conference of the Society for Economic Botany and the International Society for Ethnopharmacology}, + month = {1996 Jul~1--6}, + address = {London}, + publisher = {London: Royal Botanic Gardens, Kew}, + year = 1998, + pages = {75--81}} + +@BOOK{Ind01, + author = {Indryan, A. and Sarmukaddam, S. B.}, + title = {Medical Biostatistics}, + address = {New York (NY)}, + publisher = {Marcel Dekker}, + year = 2001, + series = {Biostatistics}, + number = 7} + +@BOOK{Jen05, + author = {Jenkins, P. F.}, + title = {Making Sense of the Chest X-ray: A Hands-on Guide}, + address = {New York (NY)}, + publisher = {Oxford University Press}, + year = 2005} + +@ARTICLE{KKZ06, + author = {Klose, R. J. and Kallin, E. M. and Zhang, Y.}, + title = {{JmjC}-domain-containing proteins and histone demethylation}, + journal = {Nat. Rev. Genet.}, + year = 2006, + volume = 7, + pages = {715--727}} + +@INPROCEEDINGS{Leo04, + author = {Leonard, K. J. and Winkelman, W.}, + title = {Developing Electronic Patient Records: Employing Interactive Methods to Ensure Patient Involvement}, + editor = {Ferreira de Oliveira, M. J.}, + booktitle = {Accessibility and quality of health services. Proceedings of the 28th Meeting of the European Working Group on Operational Research Applied to Health Services (ORAHS)}, + month = {2002 Jul~28--Aug~2}, + address = {Rio de Janeiro, Brazil}, + publisher = {Frankfurt (Germany): Peter Lang}, + year = {c2004}, + pages = {241--255}} + +@BOOK{Luz85, + author = {Luzikov, V. N.}, + title = {Mitochondrial Biogenesis and Breakdown. {Galkin~AV, translator; Roodyn~DB, editor}}, + address = {New York (NY)}, + publisher = {Consultants Bureau}, + year = 1985} + +@ARTICLE{Lyd08, + author = {Lyderson, K}, + title = {Risk of Disease Rises with Water Temperatures}, + journal = {Washington Post [Internet]}, + year = {{2008 Oct~20 [cited 2008 Dec~19]}}, + pages = {A08}, + url = {http://www.washingtonpost.com/wp-dyn/content/article/2008/10/19/AR2008101901533.html}, + note = {Article includes a correction}} + +@ARTICLE{Mac04, + author = {MacGregor, R. J.}, + title = {A Functional View of Consciousness and its Relations in Brain}, + journal = {J. Integr. Neurosci.}, + year = 2004, + volume = 3, + number = 3, + pages = {253--266}} + +@ARTICLE{Men05, + author = {Meneton, P. and Jeunemaitre, X. and de Wardener, H. E. and MacGregor, G. A.}, + title = {Links Between Dietary Salt Intake, Renal Salt Handling, Blood Pressure, and Cardiovascular Diseases}, + journal = {Physiol. Rev.}, + year = 2005, + month = apr, + volume = 85, + pages = {679--715}} + +@ARTICLE{NBK07, + author = {Nallamothu, B. K. and Bradley, E. H. and Krumholz, H. M.}, + title = {Time to treatment in primary percutaneous coronary intervention}, + journal = {N. Engl. J. Med.}, + year = 2007, + volume = 357, + number = {}, + pages = {1631--1638}, + month = oct # "~18"} + +@TECHREPORT{HBPEP, + author = {{National High Blood Pressure Education Program (US)}}, + title = {The Fourth Report on the Diagnosis of High Blood Pressure in Children. {R}ev. ed.}, + address = {Bethesda (MD)}, + institution = {National Heart, Lung, and Blood Institute (US)}, + year = 2005, + note = {(NIH publication; no.~05-5267)}} + +@ARTICLE{NYT05, + author = {}, + title = {Taking Steps Back to Normal after Novel Rabies Therapy}, + journal = {New York Times (National Ed.)}, + year = 2005, + month = dec # "~25", + volume = 155, + number = 53439, + pages = {23 (col.~3)}, + note = {Milwaukee, Dec~24}} + +@ARTICLE{NYT06, + author = {}, + title = {Major Decline in {U.S.} Deaths is Recorded}, + journal = {New York Times (Washington Final)}, + year = 2006, + month = apr # "~20", + note = {Sect.~A:14 (col.~6)}} + +@BOOK{Och00, + author = {Ochoa, S.}, + title = {Base molecular de la expresion del mensaje genetico [{M}olecular Basis of Gene Expression]}, + address = {Madrid}, + publisher = {Consejo Superior de Investigaciones Cientificas}, + year = 2000, + note = {Spanish}} + +@PRESENTATION{Pat03, + author = {Patrias, K.}, + title = {Computer-compatible writing and editing. Paper presented at: Interacting with the digital environment: modern scientific publishing. 46th Annual Meeting of the Council of Science Editors}, + month = {2003 May~3--6}, + address = {Pittsburgh, PA}} + +@ARTICLE{PTP03, + author = {Prokai-Tatrai, K. and Prokai, L.}, + title = {Modifying Peptide Properties by Prodrug Design for Enhanced Transport into the {CNS}}, + journal = {Prog. Drug Res.}, + year = 2003, + volume = 61, + pages = {155--188}} + +@INPROCEEDINGS{Ric03, + author = {Rice, A. S. and Farquhar-Smith, W. P. and Bridges, D. and Brooks, J. W.}, + title = {Canabinoids and Pain}, + editor = {Dostorovsky, J. O. and Carr, D. B. and Koltzenburg, M.}, + booktitle = {Proceedings of the 10th World Congress on Pain}, + month = {2002 Aug~17--22}, + address = {San Diego, CA}, + publisher = {Seattle (WA): IASP Press}, + year = 2003, + pages = {437--468}} + +@INBOOK{Rif06, + author = {Riffenburgh, R. H.}, + title = {Statistics in Medicine}, + edition = {Second}, + address = {Amsterdam (Netherlands)}, + publisher = {Elsevier Academic Press}, + year = 2006, + chapter = {24, Regression and correlation methods}, + pages = {447--486}} + +@MASTERSTHESIS{Rog05, + author = {Roguskie, J. M.}, + title = {The role of \emph{Pseudomonas aeruginosa} 1244 pilin glycan in virulence}, + address = {Pittsburgh (PA)}, + school = {Duquesne University}, + year = 2005} + +@PROCEEDINGS{SSM03, + editor = {Satoh, K. and Suzuki, S. and Matsunaga, M.}, + title = {Advances in brain research: cerebrovascular disorders and neurodegeneration. Proceedings of the 6th Hirosaki International Forum of Medical Science}, + month = {2002 Oct~15--16}, + address = {Hirosaki, Japan}, + publisher = {Amsterdam (Netherlands): Elsevier}, + year = 2003, + series = {Excerpta Medica international congress series}, + number = 1251} + +@INCOLLECTION{Sum03, + author = {Sumner, P. and Mollon, J. D.}, + title = {Did Primate Trichromacy Evolve for Frugivory or Folivory?}, + editor = {Mollon, J. D. and Pokorny, J. and Knoblauch, K.}, + booktitle = {Normal and Defective Colour Vision}, + address = {New York (NY)}, + publisher = {Oxford University Press}, + year = 2003, + pages = {21--30}} + +@PROCEEDINGS{vP05, + editor = {van Pelt, J. and Kamermans, M. and Levelt, C. N. and van Ooyen, A. and Ramakers, G. J. A. and Roelfsema, P. R.}, + title = {Development, dynamics, and pathology of neuronal networks: from molecules to functional circuits. Proceedings of the 23rd International Summer School of Brain Research}, + month = {2003 Aug~25--29}, + organization = {Royal Netherlands Academy of Arts and Sciences}, + address = {Amsterdam, the Netherlands}, + publisher = {Amsterdam: Elsevier}, + year = 2005, + series = {Progress in brain research}, + volume = 147} + +@ARTICLE{Ved06, + author = {Vedantam, S.}, + title = {When Staying Cool Seems Better Than Being Bad}, + journal = {Washington Post (Final Ed.)}, + year = 2006, + month = aug # "~7", + note = {Sect.~A:2 (col.~3 ). Part of a weekly series of stories about the sociology and psychology behind news events}} + +@ARTICLE{VMD07, + author = {Veronesi, U. and Maisonneuve, P. and Decensi, A.}, + title = {Tamoxifen: an enduring star}, + journal = {J. Natl Cancer Inst.}, + year = 2007, + volume = 99, + number = 4, + pages = {258--260}, + month = feb # "~21"} + +@BOOK{Wen95, + author = {Wenger, N. K. and Sivarajan Froelicher, E. and Smith, L. K. and Ades, P. A. and Berra, K. and Blumenthal, J. A. and Certo, C. M. E. and Dattilo, A. M. and Davis, D. and DeBusk, R. F. and others}, + title = {Cardiac Rehabilitation}, + publisher = {Agency for Health Care Policy and Research (US)}, + address = {Rockville (MD)}, + year = 1995} + +@ARTICLE{Wil04, + author = {Wilkniss, S. M. and Hunter, R. H. and Silverstein, S. M.}, + title = {Traitement multimodal de l'agressivit{\'e} et de la violence chez des personnes souffrant de psychose [{M}ultimodal Treatment of Aggression and Violence in Individuals with Psychosis]}, + journal = {Sante Ment Que}, + year = {2004 Autumn}, + volume = 29, + number = 2, + pages = {143--174}, + note = {French}} + +@PHDTHESIS{Zha05, + author = {Zhao, C.}, + title = {Development of Nanoelectrospray and Application to Protein Research and Drug Discovery}, + address = {Buffalo (NY)}, + school = {State University of New York at Buffalo}, + year = 2005} + +@BOOK{Sch02, + author = {Schott, J. and Priest, J.}, + title = {Leading antenatal classes: a practical guide}, + edition = {2nd ed}, + address = {Boston (MA)}, + publisher = {Books for Midwives}, + year = 2002} + +@INCOLLECTION{Sha78, + author = {Shakelford, R. T.}, + title = {Esophagoscopy}, + booktitle = {Surgery of the alimentary tract}, + publisher = {W.B. Saunders}, + address = {Philadelphia (PA)}, + year = 1978, + pages = "29--40", + chapter = 2} + +@ARTICLE{Smi75, + author = {Smith, C. E.}, + title = {The significance of mosquito longevity and blood-feeding behaviour in the dynamics of arbovirus infections}, + journal = {Med Biol}, + year = {1975}, + volume = 53, + pages = {288--294}} + +@ARTICLE{SRW05, + author = {Savage, E. and Ramsay, M. and White, J. et al}, + title = {Mumps outbreaks across {E}ngland and {W}ales in 2004: {O}bservational study}, + journal = {BMJ}, + year = 2005, + volume = 330, + number = 7500, + pages = {1119--1120}, + note = {[cited 2005 May 31]; Available from: http://bmj.bmjjournals.com/cgi/reprint/330/7500/1119}} + +@MISC{ACSPD, + title = {ACS Publications Division Home Page}, + url = {http://pubs.acs.org}, + lastchecked = {Nov~7, 2004}} + +@MANUAL{USDA00, + author = {{U.S. Department of Agriculture}}, + title = {Agriculture Fact Book 2000}, + organization = {U.S. Government Printing Office}, + address = {Washington, DC}, + year = {2000}} + +@INCOLLECTION{Alm96, + author = {Almlof, J. and Gropen, O.}, + title = {Relativistic Effects in Chemistry}, + booktitle = {Reviews in Computational Chemistry}, + editor = {Lipkowitz, K. B. and Boyd, D. B.}, + publisher = {VCH}, + address = {New York}, + year = {1996}, + volume = {8}, + pages = {206--210}} + +@BOOK{ACS06, + author = {{American Chemical Society, Committee on Analytical Reagents}}, + title = {Reagent Chemicals: Specifications and Procedures}, + edition = {10}, + address = {Washington, DC}, + year = {2006}} + +@BOOK{Ban75, + editor = {Bandy, A. R.}, + title = {The Chemistry of the Atmosphere: Oxidants and Oxidation in the Earth's Atmosphere}, + publisher = {Royal Society of Chemistry}, + address = {Cambridge, UK}, + year = {1995}} + +@MASTERSTHESIS{Bla04, + author = {Bl{\"a}ttler, T. M.}, + title = {Covalent Immobilization of Poly(\textsc{l}-lysine)-\textit{g}-poly(ethylene glycol) onto Aldehyde Plasma Polymer Coated Surfaces}, + type = {Diploma Thesis}, + school = {University of South Australia}, + year = {2004}} + +@ARTICLE{Bro45, + author = {Brosset, C.}, + title = {}, + journal = {Ark. Kemi, Mineral. Geol.}, + year = {1945}, + volume = {20A}, + pages = {No.~7}} + +@ARTICLE{Car01, + author = {Caruso, R. A. and Susha, A. and Caruso, F.}, + title = {Multilayered Titania, Silica and Laponite Nanoparticle Coatings on Polystyrene Colloidal Templates}, + journal = {Chem. Mater.}, + year = {2001}, + volume = {13}, + pages = {400--409}} + +@PHDTHESIS{Cha94, + author = {J. S. Chandrakanth}, + title = {Effects of Ozone on the Colloidal Stability of Particles Coated with Natural Organic Matter}, + type = {Ph.D. Dissertation}, + school = {University of Colorado}, + address = {Boulder, CO}, + year = {1994}} + +@UNPUBLISHED{Cha04, + author = {K. Chatterjee and A. Visconti and C. J. Mirocha}, + title = {Deepoxy T-2 Tetraol: A Metabolite of T-2 Toxin Found in Cow Urine}, + note = {\emph{J. Agric. Food Chem.}, submitted for publication, 2004}} + +@ARTICLE{Cha91, + author = {Y. Chauvin and B. Gilbert and I. Guibard}, + journal = {Vib. Spectrosc.}, + year = {1991}, + volume = {1}, + pages = {299--304}} + +@ARTICLE{Cha90, + author = {Y. Chauvin and B. Gilbert and I. Guibard}, + journal = {J. Chem. Soc., Chem. Commun.}, + year = {1990}, + pages = {1715--1716}} + +@PRESENTATION{Diz04, + author = {B. Dizman and M. O. Elasri and L. J. Mathias}, + title = {Presented at the 227th National Meeting of the American Chemical Society}, + address = {Anaheim, CA}, + month = {March~28--April~1}, + year = {2004}, + note = {Paper POLY 229}} + +@PHDTHESIS{Eri04, + author = {T. A. Erickson}, + title = {Development and Application of Geostatistical Methods to Modeling Spatial Variation in Snowpack Properties, Front Range, Colorado}, + type = {Ph.D. Dissertation}, + school = {University of Colorado}, + address = {Boulder, CO}, + year = {2004}} + +@INPROCEEDINGS{Gar88, + author = {Garrone, E. and Ugliengo, P.}, + title = {}, + booktitle = {Structure and Reactivity of Surfaces, \emph{Proceedings of the European Conference}}, + address = {Trieste, Italy}, + month = sep # "~13--20, 1988", + editor = {Zecchina, A. and Cost, G. and Morterra, C.}, + publisher = {Elsevier: Amsterdam}, + year = {1988}} + +@BOOK{Gou02, + author = {Gould, S. J.}, + title = {The Structure of Evolutionary Theory}, + publisher = {Belknap Press}, + address = {Cambridge, MA}, + year = {2002}} + +@INCOLLECTION{Hil90, + author = {Hillman, L. W.}, + title = {}, + booktitle = {Dye Laser Principles with Applications}, + editor = {Duarte, F. J. and Hillman, L. W.}, + publisher = {Academic}, + address = {New York}, + year = {1990}, + chapter = {2}} + +@INCOLLECTION{Hol05, + author = {Holbrey, J. D. and Chen, J. and Turner, M. B. and Swatloski, R. P. and Spear, S. K. and Rogers, R. D.}, + title = {Applying Ionic Liquids for Controlled Processing of Polymer Materials}, + booktitle = {Ionic Liquids in Polymer Systems: Solvents, Additives, and Novel Applications}, + editor = {Brazel, C. S. and Rogers, R. D.}, + series = {ACS Symposium Series}, + number = {913}, + publisher = {American Chemical Society}, + address = {Washington, DC}, + year = {2005}, + pages = {71--88}} + +@BOOK{Kli04, + author = {Kline, R. B.}, + title = {Principles and Practice of Structural Equation Modeling}, + edition = {Second}, + publisher = {Guilford Press}, + address = {New York}, + year = {2004}} + +@ARTICLE{Kli05, + author = {Klingler, J.}, + title = {Influence of Pretreatment on Sodium Powder}, + journal = {Chem. Mater.}, + year = {2005}, + volume = {17}, + pages = {2755--2768}} + +@INBOOK{LeC03, + author = {Le Couteur, P. and Burreson, J.}, + year = {2003}, + title = {Napoleon's Buttons: How 17 Molecules Changed History}, + edition = {}, + address = {New York}, + publisher = {Jeremy P. Tarcher/Putnam}, + pages = {32--47}} + +@MISC{Len04, + author = {Lenssen, K. C. and Jantscheff, P. and Kiedrowski, G. and Massing, U.}, + title = {Cationic Lipids with Serine Backbone for Transfecting Biological Molecules}, + note = {Eur. Pat. Appl. 1457483, 2004}} + +@BOOK{Leo05, + editor = {S. R. Leone and A. E. McDermott and A. Paul}, + title = {Annual Review of Physical Chemistry}, + publisher = {Annual Reviews}, + address = {Palo Alto, CA}, + year = {2005}, + volume = {56}} + +@ARTICLE{LP02, + author = {Y. Lu and J. J. Pignatello}, + title = {}, + journal = {Environ. Sci. Technol.}, + year = {2002}, + volume = {36}, + pages = {4553--4561}} + +@ARTICLE{LP04, + author = {Y. Lu and J. J. Pignatello}, + title = {}, + journal = {Environ. Sci. Technol.}, + year = {2004}, + volume = {38}, + pages = {5853--5862}} + +@PHDTHESIS{Mae04, + author = {M{\"a}ckel, H.}, + title = {Capturing the Spectra of Silicon Solar Cells}, + school = {The Australian National University}, + year = {December 2004}} + +@BOOK{McG02, + title = {McGraw-Hill Encyclopedia of Science and Technology}, + edition = 9, + publisher = {McGraw-Hill}, + address = {New York}, + year = {2002}, + note = {20 vols}} + +@PHDTHESIS{Moh04, + author = {M. Mohamed}, + title = {Waterjet Cutting Up to 900~MPa}, + school = {University of Hannover}, + address = {Germany}, + year = {2004}} + +@INBOOK{Mor03, + author = {Morris, R.}, + year = {2003}, + title = {The Last Sorcerers: The Path from Alchemy to the Periodic Table}, + edition = {}, + address = {Washington, DC}, + publisher = {Joseph Henry Press}, + pages = {145--158}} + +@ARTICLE{Mul05, + author = {Mullin, R.}, + title = {}, + journal = {Chem. Eng. News}, + year = {2005}, + volume = {83}, + number = {Oct~17}, + pages = {7}} + +@MISC{Pet99, + author = {Petrovick, P. R. and Carlini, E.}, + title = {Antiulcerogenic Preparation from \textit{Maytenus ilicifolia} and Obtaintion Process}, + note = {Br. Patent PI 994502, March~6, 1999}} + +@INCOLLECTION{Pul04, + author = {Puls, J. and Saake, B.}, + title = {Industrially Isolated Hemicelluloses}, + booktitle = {Hemicelluloses: Science and Technology}, + editor = {Gatenholm, P. and Tenkanen, M.}, + series = {ACS Symposium Series}, + number = {864}, + publisher = {American Chemical Society}, + address = {Washington, DC}, + year = {2004}, + pages = {24--37}} + +@ARTICLE{Pus05, + author = {Puskas, J. E. and Chan, S. W. P. and McAuley, K. B. and Shaikh, S. and Kaszas, G.}, + title = {}, + journal = {J. Polym. Sci., Part A: Polym. Chem.}, + year = {2005}, + volume = {43}, + pages = {5394--5413 and references therein}} + +@BOOK{Sah04, + editor = {Saha, B. C. and Hayashi, K.}, + title = {Lignocellulose Biodegradation}, + series = {ACS Symposium Series}, + number = {889}, + publisher = {American Chemical Society}, + address = {Washington, DC}, + year = {2004}} + +@MISC{She04, + author = {Sheem, S. K.}, + title = {Low-Cost Fiber Optic Pressure Sensor}, + note = {US Patent 6,738,537, May~18, 2004}} + +@ARTICLE{Squ05, + author = {Squires, S.}, + title = {Falling Short on Nutrients}, + journal = {The Washington Post}, + volume = {}, + month = oct # "~4", + year = {2005}, + pages = {H1}} + +@BOOK{Stoc01, + editor = {J. H. Stocker}, + title = {Chemistry and Science Fiction}, + publisher = {American Chemical Society}, + year = {1998}, + address = {Washington, DC}} + +@ARTICLE{Tay05, + author = {Taylor, C. W. and Kumar, S.}, + title = {}, + journal = {Eur. J. Cancer}, + year = {2005}, + volume = {40}, + number = {Suppl.~1}, + pages = {781}} + +@TECHREPORT{Tsc04, + author = {Tschantz, B. A. and Moran, B. M.}, + title = {Modeling of the Hydrologic Transport of Mercury in the {UEFPC} Watershed}, + institution = {Lockheed Martin Energy Systems}, + address = {Bethesda, MD}, + month = {September}, + year = {2004}} + +@INCOLLECTION{Wib74, + author = {Wiberg, K.}, + title = {}, + booktitle = {Investigations of Rates and Mechanisms of Reactions}, + editor = {E. S. Lewis}, + series = {Techniques of Chemistry}, + volume = {VI, Part~I}, + publisher = {Wiley}, + address = {New York}, + year = {1974}, + pages = {764}} + +@BOOK{WHO02, + author = {{World Health Organization}}, + title = {Pathology and Genetics of Tumours of the Head and Neck}, + address = {Albany, NY}, + year = {2002}, + volume = {9}} + +@PRESENTATION{Zie03, + author = {K. D. Zientek and J. R. Eyler}, + title = {Presented at the 51st ASMS Conference on Mass Spectrometry and Allied Topics}, + address = {Montreal, Canada}, + month = jun # "~8--12, 2003"} + +@PHDTHESIS{Agu95, + author = {Agutter, A. J.}, + title = "The Linguistic Significance of Current {B}ritish Slang", + school = {Edinburgh University}, + type = {Unpublished doctoral dissertation}, + address = {UK}, + month = {}, + year = 1995, + note = {},} + +@BOOK{Ali95, + author = {S. Alinhac}, + year = 1995, + title = {Blowup for Nonlinear Hyperbolic Equations}, + volume = 17, + series = {Progress in Nonlinear Differential Equations and Applications}, + publisher = {Birkh{\"a}user}, + address = {Boston, MA}} + +@BOOK{Bow76, + editor = {F. E. Bowder}, + title = {Nonlinear Operators and Nonlinear Equations of Evolution in {B}anach Spaces}, + series = {Proceedings of Symposia in Pure Mathematics}, + volume = {18, Part~2}, + publisher = {American Mathematical Society}, + address = {Providence, RI}, + year = 1976} + +@ARTICLE{BGP02, + author = {J. Burckhardt and M. Gunzburger and J. Peterson}, + title = {Insensitive Functionals, Inconsistent Gradients, Spurious Minima, and Regularized Functionals in Flow Optimization Problems}, + journal = {Int. J. Comput. Fluid Dyn.}, + year = 2002, + volume = 16, + pages = {171--185}} + +@INCOLLECTION{Con96, + author = {Conn, A. R. and Toint, P. L.}, + title = {An Algorithm Using Quadratic Interpolation}, + booktitle = {Nonlinear Optimization and Applications}, + editor = {Di Pillo, G. and Giannessi, F.}, + publisher = {Kluwer Academic/Plenum Publishers}, + address = {New York}, + year = 1996, + pages = {27–-47}} + +@ARTICLE{Coo03, + author = {Coope, I. D. and Price, C. J.}, + title = {Positive Bases in Numerical Optimization}, + journal = {Comput. Optim. Appl.}, + volume = 21, + year = 2003, + pages = {169–-175}} + +@PHDTHESIS{Ell98, + author = {J. S. Ellenberg}, + title = {Hilbert modular forms and the {G}alois representations associated to {H}ilbert-{B}lumenthal abelian varieties}, + school = {Harvard University}, + year = 1998} + +@BOOK{Fle80, + author = {R. Fletcher}, + title = {Practical Methods of Optimization}, + edition = {Second}, + volume = 2, + publisher = {Wiley and Sons}, + address = {New York}, + year = 1980} + +@BOOK{FGK03, + author = {R. Fourer and D. M. Gay and B. W. Kernighan}, + title = {{AMPL}: A Modeling Language for Mathematical Programming}, + edition = {Second}, + publisher = {Thomson/Brooks/Cole}, + address = {Pacific Grove, CA}, + year = 2003} + +@INTRANSLATEDBOOK{fzf88, + author = {F. French}, + translator = {P. Smith}, + title = {English title of a chapter in the translation of a book in a foreign language}, + booktitle = {Title of a Book in Another Language (Quoted in that Language)}, + englishtitle = {English Title}, + volume = {}, + series = {}, + publisher = {Dover}, + address = {New York}, + edition = {}, + month = {}, + year = 1988, + note = {(original work published 1923)},} + +@BOOK{GMW81, + author = {Gill, P. E. and Murray, W. and Wright, M. H.}, + title = {Practical Optimization}, + publisher = {Academic Press}, + address = {London}, + year = 1981} + +@INCOLLECTION{Glo00, + author = {Glover, Fred}, + title = {Multi-start and strategic oscillation methods -- principles to exploit adaptive memory}, + editor = {Laguna, Manuel and Gonz{\'a}les-Velarde, Jos{\'e} Luis}, + booktitle = {Computing Tools for Modeling, Optimization and Simulation: Interfaces in Computer Science and Operations Research}, + pages = "1--24", + publisher = {Kluwer Academic}, + address = {Boston, MA}, + edition = {Second}, + year = 2000, + note = {},} + +@MISC{GHGsoft, + author = {T. G. Golda and P. D. Hough and G. Gay}, + title = "{APPSPACK} ({A}synchronous Parallel Pattern Search Package)", + note = "Software available at http://software.sandia.gov/appspack",} + +@UNPUBLISHED{Hag03, + author = {J. Haglund}, + title = {Conjectured Statistics for the {$q,t$}-{C}atalan Numbers}, + journal = "to appear in Adv. Math.", + year = "preprint (2003)", + url = "http://www.math.upenn.edu/$\sim$jhaglund",} + +@ARTICLE{Hai01, + author = {M. Haiman}, + title = {Hilbert Schemes, Polygraphs, and the {M}acdonald Positivity Conjecture}, + journal = {J. Amer. Math. Soc.}, + volume = 14, + year = 2001, + pages = {941-–1006}, + url = {http://www.math.berkeley.edu/$\sim$mhaiman}, + note = {{MR~2002c:14008}}} + +@INCOLLECTION{Har97, + author = {Hart, W. E.}, + title = {A Stationary Point Convergence Theory of Evolutionary Algorithms}, + booktitle = {Foundations of Genetic Algorithms 4}, + editor = {Belew, R. K. and Vose, M. D.}, + publisher = {Morgan Kaufmann}, + address = {San Francisco}, + year = 1997, + pages = {127–-134}} + +@ARTICLE{Hol03, + author = {J. Holt}, + title = {Multiple Bumping of Components of Deformation Spaces of Hyperbolic 3-Manifolds}, + journal = {Amer. J. Math.}, + volume = 125, + year = 2003, + pages = {691-–736}, + url = {http://muse.jhu.edu/journals/american\_journal\_of\_mathematics/v125/125.4holt.pdf}} + +@BOOK{Hor96, + editor = {U. Hornung}, + title = {Homogenization and Porous Media}, + publisher = {Springer}, + address = {Berlin}, + year = 1996} + +@INPROCEEDINGS{Ker96, + author = "Hudson Kern", + title = "The resurgent {J}apanese economy and a {J}apan--{U}nited {S}tates free trade agreement", + booktitle = "4th International Conference on the Restructuring of the Economic and Political System in {J}apan and {E}urope", + pages = {147--156}, + month = {21--25 May 1996}, + year = 1997, + address = "Milan, Italy", + organization = "", + publisher = "World Scientific, Singapore", + note = {},} + +@ARTICLE{Kih01, + author = {S. Kihara}, + title = {On an Elliptic Curve over {$Q(t)$} of Rank $\geq$14}, + journal = {Proc. Japan Acad. Ser. A Math. Sci.}, + volume = 77, + year = 2001, + pages = {50-–51}, + note = {{MR~2002a:11057}}} + +@ARTICLE{Neu83, + author = "Martin Neumann", + title = "Parallel {GRASP} with Path-Relinking for Job Shop Scheduling", + journal = {Mol. Phys.}, + year = 1983, + volume = 50, + number = 4, + pages = "841--843", + month = apr, + note = {}, } + +@BOOK{Pat88, + author = {F. W. Patel}, + editor = {}, + title = {Title of a Book}, + volume = {II}, + series = {Monographs on Technical Aspects}, + publisher = {Dover}, + address = {New York}, + edition = {}, + month = {}, + year = 1988, + note = {},} + +@TECHREPORT{Pow00, + author = {Powell, M. J. D.}, + title = {On the {L}agrange Functions of Quadratic Models that are Defined by Interpolation}, + number = {DAMTP 2000/NA10}, + institution = {Department of Applied Mathematics and Theoretical Physics, University of Cambridge}, + address = {Cambridge, UK}, + year = 2000} + +@BOOK{Ste98, + title = {Matrix Algorithms. Volume 1: Basic Decompositions}, + publisher = {SIAM}, + year = 1998, + author = {G. W. Stewart}, + address = {Philadelphia}} + +@ARTICLE{Str97, + author = {N. P. Strickland}, + title = {Finite Subgroups of Formal Groups}, + journal = {J. Pure Appl. Algebra}, + volume = 121, + year = 1997, + pages = {161--208}} + +@BOOK{Wei95, + author = {A. Weil}, + title = {Basic Number Theory}, + publisher = {Springer-Verlag}, + address = {Berlin}, + year = 1995} + +@PHDTHESIS{Agu95, + author = {Agutter, A. J.}, + title = "The Linguistic Significance of Current {B}ritish Slang", + school = {Edinburgh University}, + type = {Unpublished doctoral dissertation}, + address = {UK}, + month = {}, + year = 1995, + note = {},} + +@INTRANSLATEDBOOK{fzf88, + author = {F. French}, + translator = {P. Smith}, + title = {English title of a chapter in the translation of a book in a foreign language}, + booktitle = {Title of a Book in Another Language (Quoted in that Language)}, + englishtitle = {English Title}, + volume = {}, + series = {}, + publisher = {Dover}, + address = {New York}, + edition = {}, + month = {}, + year = 1988, + note = {(original work published 1923)},} + +@INCOLLECTION{Glo00, + author = {Glover, Fred}, + title = {Multi-start and strategic oscillation methods -- principles to exploit adaptive memory}, + editor = {Laguna, Manuel and Gonz{\'a}les-Velarde, Jos{\'e} Luis}, + booktitle = {Computing Tools for Modeling, Optimization and Simulation: Interfaces in Computer Science and Operations Research}, + pages = "1--24", + publisher = {Kluwer Academic}, + address = {Boston, MA}, + edition = {Second}, + year = 2000, + note = {},} + +@PRESENTATION{Hov03, + author = {Hovland, P.}, + title = {Automatic Differentiation and its Role in Simulation-Based Optimization}, + organization = {IMA Workshop}, + address = {Minneapolis, MN}, + year = 2003} + +@INPROCEEDINGS{Ker96, + author = "Hudson Kern", + title = "The resurgent {J}apanese economy and a {J}apan--{U}nited {S}tates free trade agreement", + booktitle = "4th International Conference on the Restructuring of the Economic and Political System in {J}apan and {E}urope", + pages = {147--156}, + month = {21--25 May 1996}, + year = "1997", + address = "Milan, Italy", + organization = "", + publisher = "World Scientific, Singapore", + note = {},} + +@MISC{Mul00, + key = {MultiSimplex 2.0}, + title = {Multi{S}implex 2.0}, + note = {Grabitech Solutions AB, Sundvall, Sweden, 2000; software available at http://www.multisimplex.com}} + +@ARTICLE{Neu83, + author = "Martin Neumann", + title = "Parallel {GRASP} with Path-Relinking for Job Shop Scheduling", + journal = {Mol. Phys.}, + year = 1983, + volume = 50, + number = 4, + pages = "841--843", + month = apr, + note = {}, } + +@BOOK{Pat88, + author = {F. W. Patel}, + editor = {}, + title = {Title of a Book}, + volume = {II}, + series = {Monographs on Technical Aspects}, + publisher = {Dover}, + address = {New York}, + edition = {}, + month = {}, + year = 1988, + note = {},} + +@UNPUBLISHED{Tay03, + author = {R. Taylor}, + title = {On the meromorphic continuation of degree two {L-functions}}, + year = {preprint (2003)}, + url = {http://abel.math.harvard.edu/$\sim$rtaylor/}} diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index 6f1f398cd..79c01d235 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -387,9 +387,9 @@ An unnumbered `Notes` section may be included before the References (if using th Different journals from Taylor & Francis have different requirements for formatting the list of references. The reference style will be one those: -- American Psychological Association (APA) -- Chicago Author-Date refrence style (CAD) -- National Library of Medicine (NLM) +- American Psychological Association reference style (APA) +- Chicago Author-Date reference style (CAD) +- National Library of Medicine reference style (NLM) - Reference Style-P (TFP) - Reference Style-Q (TFQ) - Reference Style-S (TFS) @@ -401,19 +401,60 @@ output: biblio_style: CAD ``` -[**FIXME: The following two subsections must be adapted for the different reference styles!**] - ## References cited in the text +[CAVEAT: In the subsections below, the only one that will be typeset correctly that that corresponding to the value specified in the `biblio_style` field of the YAML header in this file.] + +### American Psychological Association reference style (APA) + +References should be cited in accordance with \citeauthor{APA10} (APA) style, i.e. in alphabetical order separated by semicolons, e.g. ‘\citep{Ban77,Pia88,VL07}’ or ‘\ldots see Smith (1985, p. 75)’. If there are two or more authors with the same surname, use the first author's initials with the surnames, e.g. ‘\citep{Lig08,Lig06}’. If there are three to five authors, list all the authors in the first citation, e.g. ‘\citep{GSSM91}’. In subsequent citations, use only the first author's surname followed by et al., e.g. ‘\citep{GSSM91}’. For six or more authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, \ldots) with the year to order the entries in the reference list and use these lower-case letters with the year in the in-text citations, e.g. ‘(Green, 1981a,b)’. For further details on this reference style, see the Instructions for Authors on the Taylor & Francis website. + +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Nas93` in the citation form `\citep{Nas93}` produces ‘\citep{Nas93}’, and the keys `Koc59`, `Han04` and `Cla08` in the citation form `\citep{Koc59,Han04,Cla08}` produce ‘\citep{Koc59,Han04,Cla08}’. The citation `\citep{Cha08}` produces ‘\citep{Cha08}’ where the citation first appears in the text, and ‘\citep{Cha08}’ in any subsequent citation. The appropriate citation style for different situations can be obtained, for example, by `\citet{Ovi95}` for ‘\citet{Ovi95}’, `\citealp{MPW08}` for ‘\citealp{MPW08}’, and `\citealt{Sch93}` for ‘\citealt{Sch93}’. Citation of the year alone may be produced by `\citeyear{Sch00}`, i.e. ‘\citeyear{Sch00}’, or `\citeyearpar{Gra05}`, i.e. ‘\citeyearpar{Gra05}’, or of the author(s) alone by `\citeauthor{Rit74}`, i.e. ‘\citeauthor{Rit74}’. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\citep[p.~31]{Hay08}` produces ‘\citep[p. 31]{Hay08}’; `\citep[see][pp.~73-77]{PI51}` produces ‘\citep[see][pp. 73--77]{PI51}’; `\citep[e.g.][]{Fel81}` produces ‘\citep[e.g.][]{Fel81}’. A ‘plain’ `\cite` command will produce the same results as a `\citet`, i.e. `\cite{BriIP}` will produce ‘\cite{BriIP}’. + +### Chicago Author-Date reference style (CAD) + +References should be cited in Chicago author-date style, e.g. ‘\citep{Alb05,Gre08,Sch87}’ or ‘\ldots~see Smith (1985,~75)’. If there are three authors, list them all in every citation, e.g. ‘\citep{Nowacki20}’. For more than three authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, ...) with the year to order the entries in the References list and use these letters with the year in the in-text citations, e.g. ‘\citep{FogEHPD04,FogJEE04}’. If two or more authors have the same surname, use their initials with the surnames, e.g. ‘(C. Doershuk 2010; J. Doershuk 2009)’. If the first author's names and the years of publication are identical for several references, include enough co-author names to eliminate ambiguity, e.g. `(Schonen, Baker, et al. 2009; Schonen, Brooks, et al. 2009)'. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. + +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Fow89` in the citation form `\citep{Fow89}` produces ‘\citep{Fow89}’, and the keys `{Bro86,Bro02,Roh08}` in the citation form `\citep{Bro86,Bro02,Prinzie09}` produce ‘\citep{Bro86,Bro02,Prinzie09}’. The appropriate citation style for different situations can be obtained, for example, by `\citet{Draper1987}` for ‘\citet{Draper1987}’, `\citealt{Lev05}` for ‘\citealt{Lev05}’, or `\citealp{Mor08}` for ‘\citealp{Mor08}’. Citation of the year alone may be produced by `\citeyear{Cho08}`, i.e. ‘\citeyear{Cho08}’, or `\citeyearpar{ChoGul08}`, i.e. ‘\citeyearpar{ChoGul08}’, or of the author(s) alone by `\citeauthor{Wittgenstein2009}`, i.e. ‘\citeauthor{Wittgenstein2009}’. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\citep[see][275]{Ell1968}` produces ‘\citep[see][275]{Ell1968}’; `\citep[e.g.][]{Wau50}` produces ‘\citep[e.g.][]{Wau50}’; `\citet[chap.~2]{Str00}` produces ‘\citet[chap.~2]{Str00}’. A ‘plain’ `\cite` command will produce the same result as a `\citet`, i.e. `\cite{Wei02}` will produce ‘\cite{Wei02}’. + +### National Library of Medicine reference style (NLM) + +References should be cited in accordance with US National Library of Medicine (NLM) style. References are cited in the text by a number in square brackets (e.g. [1], [2,4,10], [11--15], _not_ [11]--[15]), in the order in which they first appear. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. + +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Jen05` in the citation form `\cite{Jen05}` produces ‘\cite{Jen05}’, and the keys `{Sch02,Wen95}` in the citation form `\cite{Sch02,Wen95}` produce ‘\cite{Sch02,Wen95}’. The citation for a range of bibliographic entries (e.g.\ ‘\cite{Sha78,AG98,Smi75,Men05,DCK03,Hor98,Ant03,Zha05,Rog05,SRW05}’) will automatically be produced by `\cite{Sha78,AG98,Smi75,Men05,DCK03,Hor98,Ant03,Zha05,Rog05,SRW05}`. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g.\ `\cite[cf.][]{Gau05}` produces ‘\cite[cf.][]{Gau05}’, `\cite[p.356]{BGC04}` produces ‘\cite[p.356]{BGC04}’, and `\cite[see][p.73--77]{PI51}` produces ‘\cite[see][p.73--77]{PI51}’. + +### Reference Style-P (TFP) + +References cited in the text should be quoted by italic numbers in parentheses (e.g.\ (_1_), (_2_, _4_, _10_), (_11_--_15_), _not_ (_11_)--(_15_)), in the order in which they first appear. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. + +Each bibliographic entry has a key, which is assigned by the author and used to refer to that entry in the text. In this document, the key `Gou02` in the citation form `\cite{Gou02}` produces ‘\cite{Gou02}’, and the keys `LeC03` and `Ban75` in the citation form `\cite{LeC03,Ban75}` produce ‘\cite{LeC03,Ban75}’. The citation for a range of bibliographic entries such as ‘\cite{Sah04,Hil90,Pul04,Kli04,Leo05,Wib74,McG02,Gar88,Zie03,Cha94,Moh04,ACSPD,Car01,Pus05,Mul05,Tay05,Squ05,Len04,Pet99,She04,Tsc04,Cha04}’ will automatically be produced by `\cite{Sah04,Hil90,Pul04,Kli04,Leo05,Wib74,McG02,Gar88,Zie03,Cha94,Moh04,` `ACSPD,Car01,Pus05,Mul05,Tay05,Squ05,Len04,Pet99,She04,Tsc04,Cha04}`. By using the `merge` option to `natbib`, citation keys within a multiple `\cite` command may contain a leading `*` that causes them to be merged in the bibliography together with the previous citation as a single entry with a single reference number. For example, `\cite{LP02,*LP04}` produces ‘\cite{LP02,*LP04}’, and both references are listed in the bibliography under one entry with that number. + + +### Reference Style-Q (TFQ) + +References should be cited in the text by a number in square brackets (e.g. [1], [2,4,10], [11--15], not [11]--[15]) in the order in which they first appear. For further details on this reference style, see the Instructions for Authors on the Taylor & Francis website. + +Each bibliographical entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Ali95` in the citation form `\cite{Ali95}` produces ‘\cite{Ali95}’, and the keys `Wei95` and `GMW81` in the citation form `\cite{Wei95,GMW81}` produce ‘\cite{Wei95,GMW81}’. The citation for a range of bibliographic entries (e.g. ‘\cite{Bow76,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,BGP02,Kih01,Hol03,Hai01,Hag03}’) will automatically be produced by `\cite{Bow76,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,BGP02,` `Kih01,Hol03,Hai01,Hag03}`. Optional notes may be included at the end of a citation by the use of square brackets, e.g. `\cite[cf.][]{GHGsoft}` produces ‘\cite[cf.][]{GHGsoft}’, and `\cite[see][and references therein]{Pow00}` produces ‘\cite[see][and references therein]{Pow00}’. + +### Reference Style-S (TFS) + +References should be cited in the text by numbers in square brackets based on the order in which they appear in an alphabetical list of references at the end of the document (not the order of citation), so the first reference cited in the text might be [23]. For example, these may take the forms [32], [5,,6,,14], [21--55] (\emph{not} [21]--[55]). For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. + +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Ali95` in the citation form `\cite{Ali95}` produces ‘\cite{Ali95}’, and the keys `Bow76` and `BGP02` in the citation form `\cite{Bow76,BGP02}` produce ‘\cite{Bow76,BGP02}’. The citation for a range of bibliographic entries (e.g. ‘\cite{GMW81,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,Kih01,Hol03,Hai01,Hag03,Hov03,Mul00,GHGsoft,Pow00}’) will automatically be produced by `\cite{GMW81,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,Kih01,` `Hol03,Hai01,Hag03,Hov03,Mul00,GHGsoft,Pow00}`. +Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\cite[cf.][]{Tay03}` produces ‘\cite[cf.][]{Tay03}’, and `\cite[see][and references therein]{Wei95}` produces ‘\cite[see][and references therein]{Wei95}’. + + ## The list of references -References should be listed at the end of the main text in alphabetical order by authors' surnames, then chronologically (earliest first). If references have the same author(s), editor(s), etc., arrange by year of publication, with undated works at the end. -A single-author entry precedes a multi-author entry that begins with the same name. -If the reference list contains two or more items by the same author(s) in the same year, add a, b, etc. and list them alphabetically by title. -Successive entries by two or more authors when only the first author is the same are alphabetized by co-authors' surnames. -If a reference has more than ten named authors, list only the first seven, followed by 'et al.'. -If a reference has no author or editor, order by title; if a date of publication is impossible to find, use `n.d.' in its place. +Authors should create the list of references using a \textsc{Bib}\TeX\ database. \LaTeX/\textsc{Bib}\TeX\ will extract from your .bib file only those references that are cited in your text and list them in the References section. According to the chosen reference style, one of the following .bst files will be automatically used: + +- APA: `apacite.bst` +- CAD: `tfcad.bst` +- NLM: `tfnlm.bst` +- TFP: `tfp.bst` +- TFQ: `tfq.bst` +- TFS: `tfs.bst` -The following list shows some sample references prepared in the Taylor & Francis Chicago author-date style. +Besides from `apacite.bst`, which is part of standard \LaTeX\ distributions, the files listed below should have been installed in the same directory of this skeleton file. You may delete the ones that are not needed. -[@Blair1977; @Alb05] +Please include a copy of your .bib file and/or the final generated .bbl file among your source files. From 97dedba20d05eb6bd45571e166e918fba0974203 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Mon, 2 Dec 2024 22:27:06 +0100 Subject: [PATCH 07/29] Drop obsolete file name at the top --- inst/rmarkdown/templates/tf/resources/template.tex | 3 --- 1 file changed, 3 deletions(-) diff --git a/inst/rmarkdown/templates/tf/resources/template.tex b/inst/rmarkdown/templates/tf/resources/template.tex index 199421e0e..8ecf1e468 100644 --- a/inst/rmarkdown/templates/tf/resources/template.tex +++ b/inst/rmarkdown/templates/tf/resources/template.tex @@ -1,6 +1,3 @@ -% interactcadsample.tex -% v1.04 - May 2023 - \documentclass[$for(classoption)$$classoption$$sep$,$endfor$]{interact} \usepackage{etoolbox} From 6aa60cf826fc3eb3352d4ec7fa83821d1c921507 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Mon, 2 Dec 2024 22:27:42 +0100 Subject: [PATCH 08/29] Ensure that CAD reference style is done with author-date natbib scheme --- inst/rmarkdown/templates/tf/resources/template.tex | 7 ++++--- 1 file changed, 4 insertions(+), 3 deletions(-) diff --git a/inst/rmarkdown/templates/tf/resources/template.tex b/inst/rmarkdown/templates/tf/resources/template.tex index 8ecf1e468..e560630b9 100644 --- a/inst/rmarkdown/templates/tf/resources/template.tex +++ b/inst/rmarkdown/templates/tf/resources/template.tex @@ -16,7 +16,8 @@ {\ifboolexpr{% test {\ifstrequal{$bst-name$}{tfcad}}% or test {\ifstrequal{$bst-name$}{}}}% Default - {\usepackage{natbib}}% Citation support using natbib.sty + {\usepackage{natbib}% Citation support using natbib.sty + \bibpunct[, ]{(}{)}{;}{a}{}{,}}% Citation support using natbib.sty {\ifboolexpr{% test {\ifstrequal{$bst-name$}{tfnlm}}% or test {\ifstrequal{$bst-name$}{tfq}}% @@ -31,8 +32,8 @@ {\usepackage[numbers,sort&compress,merge]{natbib}% Citation support using natbib.sty \renewcommand\citenumfont[1]{\textit{#1}}% Citation numbers in italic font using natbib.sty \renewcommand\bibnumfmt[1]{(#1)}}% Parentheses enclose ref. numbers in list using natbib.sty - {\BiblioStyleErrorMessage}}} - \bibpunct[, ]{[}{]}{,}{n}{,}{,}% Citation support using natbib.sty + {\BiblioStyleErrorMessage}}% + \bibpunct[, ]{[}{]}{,}{n}{,}{,}}% Citation support using natbib.sty \renewcommand\bibfont{\fontsize{10}{12}\selectfont}}% Bibliography support using natbib.sty \theoremstyle{plain}% Theorem-like structures provided by amsthm.sty From da8f5e297586e49e479012bb59f3cf8d53fd0d3e Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Mon, 2 Dec 2024 22:28:31 +0100 Subject: [PATCH 09/29] Replace tilde with non-breaking space --- inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index 79c01d235..0f9ee5d87 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -413,9 +413,9 @@ Each bibliographic entry has a key, which is assigned by the author and is used ### Chicago Author-Date reference style (CAD) -References should be cited in Chicago author-date style, e.g. ‘\citep{Alb05,Gre08,Sch87}’ or ‘\ldots~see Smith (1985,~75)’. If there are three authors, list them all in every citation, e.g. ‘\citep{Nowacki20}’. For more than three authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, ...) with the year to order the entries in the References list and use these letters with the year in the in-text citations, e.g. ‘\citep{FogEHPD04,FogJEE04}’. If two or more authors have the same surname, use their initials with the surnames, e.g. ‘(C. Doershuk 2010; J. Doershuk 2009)’. If the first author's names and the years of publication are identical for several references, include enough co-author names to eliminate ambiguity, e.g. `(Schonen, Baker, et al. 2009; Schonen, Brooks, et al. 2009)'. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. +References should be cited in Chicago author-date style, e.g. ‘\citep{Alb05,Gre08,Sch87}’ or ‘\ldots see Smith (1985, 75)’. If there are three authors, list them all in every citation, e.g. ‘\citep{Nowacki20}’. For more than three authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, ...) with the year to order the entries in the References list and use these letters with the year in the in-text citations, e.g. ‘\citep{FogEHPD04,FogJEE04}’. If two or more authors have the same surname, use their initials with the surnames, e.g. ‘(C. Doershuk 2010; J. Doershuk 2009)’. If the first author's names and the years of publication are identical for several references, include enough co-author names to eliminate ambiguity, e.g. `(Schonen, Baker, et al. 2009; Schonen, Brooks, et al. 2009)'. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. -Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Fow89` in the citation form `\citep{Fow89}` produces ‘\citep{Fow89}’, and the keys `{Bro86,Bro02,Roh08}` in the citation form `\citep{Bro86,Bro02,Prinzie09}` produce ‘\citep{Bro86,Bro02,Prinzie09}’. The appropriate citation style for different situations can be obtained, for example, by `\citet{Draper1987}` for ‘\citet{Draper1987}’, `\citealt{Lev05}` for ‘\citealt{Lev05}’, or `\citealp{Mor08}` for ‘\citealp{Mor08}’. Citation of the year alone may be produced by `\citeyear{Cho08}`, i.e. ‘\citeyear{Cho08}’, or `\citeyearpar{ChoGul08}`, i.e. ‘\citeyearpar{ChoGul08}’, or of the author(s) alone by `\citeauthor{Wittgenstein2009}`, i.e. ‘\citeauthor{Wittgenstein2009}’. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\citep[see][275]{Ell1968}` produces ‘\citep[see][275]{Ell1968}’; `\citep[e.g.][]{Wau50}` produces ‘\citep[e.g.][]{Wau50}’; `\citet[chap.~2]{Str00}` produces ‘\citet[chap.~2]{Str00}’. A ‘plain’ `\cite` command will produce the same result as a `\citet`, i.e. `\cite{Wei02}` will produce ‘\cite{Wei02}’. +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Fow89` in the citation form `\citep{Fow89}` produces ‘\citep{Fow89}’, and the keys `{Bro86,Bro02,Roh08}` in the citation form `\citep{Bro86,Bro02,Prinzie09}` produce ‘\citep{Bro86,Bro02,Prinzie09}’. The appropriate citation style for different situations can be obtained, for example, by `\citet{Draper1987}` for ‘\citet{Draper1987}’, `\citealt{Lev05}` for ‘\citealt{Lev05}’, or `\citealp{Mor08}` for ‘\citealp{Mor08}’. Citation of the year alone may be produced by `\citeyear{Cho08}`, i.e. ‘\citeyear{Cho08}’, or `\citeyearpar{ChoGul08}`, i.e. ‘\citeyearpar{ChoGul08}’, or of the author(s) alone by `\citeauthor{Wittgenstein2009}`, i.e. ‘\citeauthor{Wittgenstein2009}’. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\citep[see][275]{Ell1968}` produces ‘\citep[see][275]{Ell1968}’; `\citep[e.g.][]{Wau50}` produces ‘\citep[e.g.][]{Wau50}’; `\citet[chap.~2]{Str00}` produces ‘\citet[chap. 2]{Str00}’. A ‘plain’ `\cite` command will produce the same result as a `\citet`, i.e. `\cite{Wei02}` will produce ‘\cite{Wei02}’. ### National Library of Medicine reference style (NLM) From 6715c81fee676deda2dc19961dd1d61a4947239e Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Mon, 2 Dec 2024 22:33:34 +0100 Subject: [PATCH 10/29] Reword caveat --- inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index 0f9ee5d87..a90f2e2cb 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -403,7 +403,7 @@ output: ## References cited in the text -[CAVEAT: In the subsections below, the only one that will be typeset correctly that that corresponding to the value specified in the `biblio_style` field of the YAML header in this file.] +[CAVEAT: The only subsection below that will be correctly typeset is the one corresponding to the value specified in the `biblio_style` field of the YAML header.] ### American Psychological Association reference style (APA) From dfca82774dfd9bd9240a6217e2c4a11f582f6399 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Tue, 3 Dec 2024 08:46:32 +0100 Subject: [PATCH 11/29] Do bibliography commands logic in R instead of doing in TeX The convoluted logic using \ifboolexpr and \ifstrequal in the preamble of template.tex is done now done in function tf_article(). A new pandoc variable ("biblio-commands") is now used. --- R/article.R | 52 ++++++++++++++++--- .../templates/tf/resources/template.tex | 32 +----------- 2 files changed, 46 insertions(+), 38 deletions(-) diff --git a/R/article.R b/R/article.R index e8e6cdef2..108ba6a1f 100644 --- a/R/article.R +++ b/R/article.R @@ -558,12 +558,48 @@ springer_article <- function(..., keep_tex = TRUE, citation_package = "natbib", #' @rdname article tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", biblio_style = "CAD", pandoc_args = NULL) { - styles <- list(APA = "apacite", - CAD = "tfcad", - NLM = "tfnlm", - TFP = "tfp", - TFQ = "tfq", - TFS = "tfs") + styles <- list( + APA = list( + bst = "apacite", + cmd = "\\usepackage[natbibapa]{apacite} +\\setlength\\bibhang{12pt} +\\renewcommand\\bibliographytypesize{\\fontsize{10}{12}\\selectfont}" + ), + CAD = list( + bst = "tfcad", + cmd = "\\usepackage{natbib} +\\bibpunct[, ]{(}{)}{;}{a}{}{,}" + ), + NLM = list( + bst = "tfnlm", + cmd = "\\usepackage[numbers,sort&compress]{natbib} +\\makeatletter +\\def\\NAT@def@citea{\\def\\@citea{\\NAT@separator}} +\\makeatother +\\bibpunct[, ]{[}{]}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ), + TFP = list( + bst = "tfp", + cmd = "\\usepackage[numbers,sort&compress,merge]{natbib} +\\bibpunct[, ]{(}{)}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont} +\\renewcommand\\citenumfont[1]{\\textit{#1}} +\\renewcommand\\bibnumfmt[1]{(#1)}" + ), + TFQ = list( + bst = "tfq", + cmd = "\\usepackage[numbers,sort&compress]{natbib} +\\bibpunct[, ]{[}{]}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ), + TFS = list( + bst = "tfs", + cmd = "\\usepackage[numbers,sort&compress]{natbib} +\\bibpunct[, ]{[}{]}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ) + ) if (! biblio_style %in% names(styles)) stop( paste( @@ -571,9 +607,11 @@ tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", paste(names(styles), collapse = ", ") ) ) + sty <- styles[[biblio_style]] pandoc_args <- c( pandoc_args, - rmarkdown::pandoc_variable_arg("bst-name", styles[[biblio_style]]) + rmarkdown::pandoc_variable_arg("bst-name", sty$bst), + rmarkdown::pandoc_variable_arg("biblio-commands", sty$cmd) ) pdf_document_format( "tf", diff --git a/inst/rmarkdown/templates/tf/resources/template.tex b/inst/rmarkdown/templates/tf/resources/template.tex index e560630b9..d241d8e5e 100644 --- a/inst/rmarkdown/templates/tf/resources/template.tex +++ b/inst/rmarkdown/templates/tf/resources/template.tex @@ -1,40 +1,10 @@ \documentclass[$for(classoption)$$classoption$$sep$,$endfor$]{interact} -\usepackage{etoolbox} \usepackage{epstopdf}% To incorporate .eps illustrations using PDFLaTeX, etc. \usepackage{subfigure}% Support for small, `sub' figures and tables %\usepackage[nolists,tablesfirst]{endfloat}% To `separate' figures and tables from text if required -\newcommand{\BiblioStyleErrorMessage}{% - \errmessage{% - Invalid biblio_style in Taylor and Francis template. Allowed values are APA, CAD, NLM, TFP, TFQ, and TFS}} - -\ifstrequal{$bst-name$}{apacite}% - {\usepackage[natbibapa]{apacite}% Citation support using apacite.sty. Commands using natbib.sty MUST be deactivated first! - \setlength\bibhang{12pt}% To set the indentation in the list of references using apacite.sty. Commands using natbib.sty MUST be deactivated first! - \renewcommand\bibliographytypesize{\fontsize{10}{12}\selectfont}}% To set the list of references in 10 point font using apacite.sty. Commands using natbib.sty MUST be deactivated first! - {\ifboolexpr{% - test {\ifstrequal{$bst-name$}{tfcad}}% - or test {\ifstrequal{$bst-name$}{}}}% Default - {\usepackage{natbib}% Citation support using natbib.sty - \bibpunct[, ]{(}{)}{;}{a}{}{,}}% Citation support using natbib.sty - {\ifboolexpr{% - test {\ifstrequal{$bst-name$}{tfnlm}}% - or test {\ifstrequal{$bst-name$}{tfq}}% - or test {\ifstrequal{$bst-name$}{tfs}}}% - {\usepackage[numbers,sort&compress]{natbib}% Citation support using natbib.sty - \ifstrequal{$bst-name$}{tfnlm}% - {\makeatletter% @ becomes a letter - \def\NAT@def@citea{\def\@citea{\NAT@separator}}% Suppress spaces between citations using natbib.sty - \makeatother} - {}}% @ becomes a symbol again - {\ifstrequal{$bst-name$}{tfp}% - {\usepackage[numbers,sort&compress,merge]{natbib}% Citation support using natbib.sty - \renewcommand\citenumfont[1]{\textit{#1}}% Citation numbers in italic font using natbib.sty - \renewcommand\bibnumfmt[1]{(#1)}}% Parentheses enclose ref. numbers in list using natbib.sty - {\BiblioStyleErrorMessage}}% - \bibpunct[, ]{[}{]}{,}{n}{,}{,}}% Citation support using natbib.sty - \renewcommand\bibfont{\fontsize{10}{12}\selectfont}}% Bibliography support using natbib.sty +$biblio-commands$ \theoremstyle{plain}% Theorem-like structures provided by amsthm.sty \newtheorem{theorem}{Theorem}[section] From 0099208fe724c3459031523a31ed453cbd576529 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Thu, 12 Dec 2024 22:55:24 +0100 Subject: [PATCH 12/29] Put the tf_article function into a separate file (R/tf_article.R) --- R/article.R | 70 ------------------------------------ R/tf_article.R | 91 +++++++++++++++++++++++++++++++++++++++++++++++ man/article.Rd | 9 ----- man/tf_article.Rd | 54 ++++++++++++++++++++++++++++ 4 files changed, 145 insertions(+), 79 deletions(-) create mode 100644 R/tf_article.R create mode 100644 man/tf_article.Rd diff --git a/R/article.R b/R/article.R index 108ba6a1f..417e847b1 100644 --- a/R/article.R +++ b/R/article.R @@ -552,76 +552,6 @@ springer_article <- function(..., keep_tex = TRUE, citation_package = "natbib", format } -#' @section `tf_article`: Format for creating submissions to a Taylor & Francis journal. Adapted from -#' \samp{https://www.tandf.co.uk/journals/authors/InteractCADLaTeX.zip}. -#' @export -#' @rdname article -tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", - biblio_style = "CAD", pandoc_args = NULL) { - styles <- list( - APA = list( - bst = "apacite", - cmd = "\\usepackage[natbibapa]{apacite} -\\setlength\\bibhang{12pt} -\\renewcommand\\bibliographytypesize{\\fontsize{10}{12}\\selectfont}" - ), - CAD = list( - bst = "tfcad", - cmd = "\\usepackage{natbib} -\\bibpunct[, ]{(}{)}{;}{a}{}{,}" - ), - NLM = list( - bst = "tfnlm", - cmd = "\\usepackage[numbers,sort&compress]{natbib} -\\makeatletter -\\def\\NAT@def@citea{\\def\\@citea{\\NAT@separator}} -\\makeatother -\\bibpunct[, ]{[}{]}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" - ), - TFP = list( - bst = "tfp", - cmd = "\\usepackage[numbers,sort&compress,merge]{natbib} -\\bibpunct[, ]{(}{)}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont} -\\renewcommand\\citenumfont[1]{\\textit{#1}} -\\renewcommand\\bibnumfmt[1]{(#1)}" - ), - TFQ = list( - bst = "tfq", - cmd = "\\usepackage[numbers,sort&compress]{natbib} -\\bibpunct[, ]{[}{]}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" - ), - TFS = list( - bst = "tfs", - cmd = "\\usepackage[numbers,sort&compress]{natbib} -\\bibpunct[, ]{[}{]}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" - ) - ) - if (! biblio_style %in% names(styles)) - stop( - paste( - "Invalid biblio_style in Taylor and Francis article. Allowed values are:", - paste(names(styles), collapse = ", ") - ) - ) - sty <- styles[[biblio_style]] - pandoc_args <- c( - pandoc_args, - rmarkdown::pandoc_variable_arg("bst-name", sty$bst), - rmarkdown::pandoc_variable_arg("biblio-commands", sty$cmd) - ) - pdf_document_format( - "tf", - keep_tex = keep_tex, - citation_package = citation_package, - pandoc_args = pandoc_args, - ... - ) -} - #' @section \code{trb_article}: Format for creating submissions to the Transportation #' Research Board Annual Meeting. Adapted from #' \samp{https://www.overleaf.com/latex/templates/transportation-research-board-trb-latex-template/jkfndnnkkksw}, diff --git a/R/tf_article.R b/R/tf_article.R new file mode 100644 index 000000000..badd007fb --- /dev/null +++ b/R/tf_article.R @@ -0,0 +1,91 @@ +#' Taylor & Francis journals format +#' +#' Format for creating submissions to many Taylor & Francis journals. +#' Adapted from: +#' * +#' * +#' * +#' * +#' * +#' * +#' +#' @inheritParams rmarkdown::pdf_document +#' @param biblio_style should be set according to the specific Taylor & Francis +#' journal. Possibles values: "APA" (American Psychological Association +#' reference style), "CAD" (Chicago Author-Date reference style), "NLM" +#' (National Library of Medicine reference style), "TFP" (Reference +#' Style-P), "TFQ" (Reference Style-Q), and "TFS" (Reference Style-S). +#' @param ... Additional arguments to [rmarkdown::pdf_document()] +#' +#' @examples \dontrun{ +#' rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", biblio_style = "APA") +#' rmarkdown::render("MyArticle.Rmd") +#' } +#' @importFrom rmarkdown pandoc_variable_arg +#' @export +tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", + biblio_style = "CAD", pandoc_args = NULL) { + styles <- list( + APA = list( + bst = "apacite", + cmd = "\\usepackage[natbibapa]{apacite} +\\setlength\\bibhang{12pt} +\\renewcommand\\bibliographytypesize{\\fontsize{10}{12}\\selectfont}" + ), + CAD = list( + bst = "tfcad", + cmd = "\\usepackage{natbib} +\\bibpunct[, ]{(}{)}{;}{a}{}{,}" + ), + NLM = list( + bst = "tfnlm", + cmd = "\\usepackage[numbers,sort&compress]{natbib} +\\makeatletter +\\def\\NAT@def@citea{\\def\\@citea{\\NAT@separator}} +\\makeatother +\\bibpunct[, ]{[}{]}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ), + TFP = list( + bst = "tfp", + cmd = "\\usepackage[numbers,sort&compress,merge]{natbib} +\\bibpunct[, ]{(}{)}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont} +\\renewcommand\\citenumfont[1]{\\textit{#1}} +\\renewcommand\\bibnumfmt[1]{(#1)}" + ), + TFQ = list( + bst = "tfq", + cmd = "\\usepackage[numbers,sort&compress]{natbib} +\\bibpunct[, ]{[}{]}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ), + TFS = list( + bst = "tfs", + cmd = "\\usepackage[numbers,sort&compress]{natbib} +\\bibpunct[, ]{[}{]}{,}{n}{,}{,} +\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ) + ) + if (! biblio_style %in% names(styles)) + stop( + paste( + "Invalid biblio_style in Taylor and Francis article. Allowed values are:", + paste(names(styles), collapse = ", ") + ) + ) + sty <- styles[[biblio_style]] + pandoc_args <- c( + pandoc_args, + rmarkdown::pandoc_variable_arg("bst-name", sty$bst), + rmarkdown::pandoc_variable_arg("biblio-commands", sty$cmd) + ) + pdf_document_format( + "tf", + keep_tex = keep_tex, + citation_package = citation_package, + pandoc_args = pandoc_args, + ... + ) +} + diff --git a/man/article.Rd b/man/article.Rd index 098f0ee41..b7b7f5d43 100644 --- a/man/article.Rd +++ b/man/article.Rd @@ -31,7 +31,6 @@ \alias{sage_article} \alias{sim_article} \alias{springer_article} -\alias{tf_article} \alias{trb_article} \alias{wellcomeor_article} \alias{isba_article} @@ -154,9 +153,6 @@ springer_article( pandoc_args = NULL ) -tf_article(..., keep_tex = TRUE, citation_package = "natbib", - biblio_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS")) - trb_article(..., keep_tex = TRUE, citation_package = "natbib") wellcomeor_article( @@ -422,11 +418,6 @@ Possible arguments for the YAML header are: Macro package for Springer Journals. } -\section{\code{tf_article}}{ - Format for creating submissions to a Taylor & Francis journal. Adapted from -\samp{https://www.tandf.co.uk/journals/authors/InteractLaTeX.zip}, where is one of APA (American Psychological Association), CAD (Chicago Author-Date), NLM (National Library of Medicine), TFP (Reference Style P), TFQ (Reference Style Q), and TFS (Reference Style S). Authors can specify one of these options in the YAML header, according to the reference style required by the concerned journal. -} - \section{\code{trb_article}}{ Format for creating submissions to the Transportation Research Board Annual Meeting. Adapted from diff --git a/man/tf_article.Rd b/man/tf_article.Rd new file mode 100644 index 000000000..6bde0bbf9 --- /dev/null +++ b/man/tf_article.Rd @@ -0,0 +1,54 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tf_article.R +\name{tf_article} +\alias{tf_article} +\title{Taylor & Francis journals format} +\usage{ +tf_article( + ..., + keep_tex = TRUE, + citation_package = "natbib", + biblio_style = "CAD", + pandoc_args = NULL +) +} +\arguments{ +\item{...}{Additional arguments to \code{\link[rmarkdown:pdf_document]{rmarkdown::pdf_document()}}} + +\item{keep_tex}{Keep the intermediate tex file used in the conversion to PDF. +Note that this argument does not control whether to keep the auxiliary +files (e.g., \file{.aux}) generated by LaTeX when compiling \file{.tex} to +\file{.pdf}. To keep these files, you may set \code{options(tinytex.clean = +FALSE)}.} + +\item{citation_package}{The LaTeX package to process citations, \code{natbib} +or \code{biblatex}. Use \code{default} if neither package is to be used, +which means citations will be processed via the command +\command{pandoc-citeproc}.} + +\item{biblio_style}{should be set according to the specific Taylor & Francis +journal. Possibles values: "APA" (American Psychological Association +reference style), "CAD" (Chicago Author-Date reference style), "NLM" +(National Library of Medicine reference style), "TFP" (Reference +Style-P), "TFQ" (Reference Style-Q), and "TFS" (Reference Style-S).} + +\item{pandoc_args}{Additional command line options to pass to pandoc} +} +\description{ +Format for creating submissions to many Taylor & Francis journals. +Adapted from: +\itemize{ +\item \url{https://www.tandf.co.uk/journals/authors/InteractAPALaTeX.zip} +\item \url{https://www.tandf.co.uk/journals/authors/InteractCADLaTeX.zip} +\item \url{https://www.tandf.co.uk/journals/authors/InteractNLMLaTeX.zip} +\item \url{https://www.tandf.co.uk/journals/authors/InteractTFPLaTeX.zip} +\item \url{https://www.tandf.co.uk/journals/authors/InteractTFQLaTeX.zip} +\item \url{https://www.tandf.co.uk/journals/authors/InteractTFSLaTeX.zip} +} +} +\examples{ +\dontrun{ +rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", biblio_style = "APA") +rmarkdown::render("MyArticle.Rmd") +} +} From 93561369fe487a570f5a36d4a847c7d86d5a28e1 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Thu, 12 Dec 2024 23:35:38 +0100 Subject: [PATCH 13/29] Specify candidate values for the biblio_style argument --- R/tf_article.R | 4 +++- man/tf_article.Rd | 2 +- 2 files changed, 4 insertions(+), 2 deletions(-) diff --git a/R/tf_article.R b/R/tf_article.R index badd007fb..5a2bea665 100644 --- a/R/tf_article.R +++ b/R/tf_article.R @@ -24,7 +24,8 @@ #' @importFrom rmarkdown pandoc_variable_arg #' @export tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", - biblio_style = "CAD", pandoc_args = NULL) { + biblio_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS"), + pandoc_args = NULL) { styles <- list( APA = list( bst = "apacite", @@ -67,6 +68,7 @@ tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", \\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" ) ) + biblio_style <- match.arg(biblio_style) if (! biblio_style %in% names(styles)) stop( paste( diff --git a/man/tf_article.Rd b/man/tf_article.Rd index 6bde0bbf9..0f1765049 100644 --- a/man/tf_article.Rd +++ b/man/tf_article.Rd @@ -8,7 +8,7 @@ tf_article( ..., keep_tex = TRUE, citation_package = "natbib", - biblio_style = "CAD", + biblio_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS"), pandoc_args = NULL ) } From 5501b406f05ee1464fc5120ed7bd2b798fae26ea Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Fri, 13 Dec 2024 00:28:45 +0100 Subject: [PATCH 14/29] Use character vectors and paste() in order to avoid fragile code formatting --- R/tf_article.R | 61 +++++++++++++++++++++++++++++++------------------- 1 file changed, 38 insertions(+), 23 deletions(-) diff --git a/R/tf_article.R b/R/tf_article.R index 5a2bea665..9cdcf82b5 100644 --- a/R/tf_article.R +++ b/R/tf_article.R @@ -29,43 +29,55 @@ tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", styles <- list( APA = list( bst = "apacite", - cmd = "\\usepackage[natbibapa]{apacite} -\\setlength\\bibhang{12pt} -\\renewcommand\\bibliographytypesize{\\fontsize{10}{12}\\selectfont}" + cmd = c( + "\\usepackage[natbibapa]{apacite}", + "\\setlength\\bibhang{12pt}", + "\\renewcommand\\bibliographytypesize{\\fontsize{10}{12}\\selectfont}" + ) ), CAD = list( bst = "tfcad", - cmd = "\\usepackage{natbib} -\\bibpunct[, ]{(}{)}{;}{a}{}{,}" + cmd = c( + "\\usepackage{natbib}", + "\\bibpunct[, ]{(}{)}{;}{a}{}{,}" + ) ), NLM = list( bst = "tfnlm", - cmd = "\\usepackage[numbers,sort&compress]{natbib} -\\makeatletter -\\def\\NAT@def@citea{\\def\\@citea{\\NAT@separator}} -\\makeatother -\\bibpunct[, ]{[}{]}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + cmd = c( + "\\usepackage[numbers,sort&compress]{natbib}", + "\\makeatletter", + "\\def\\NAT@def@citea{\\def\\@citea{\\NAT@separator}}", + "\\makeatother", + "\\bibpunct[, ]{[}{]}{,}{n}{,}{,}", + "\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ) ), TFP = list( bst = "tfp", - cmd = "\\usepackage[numbers,sort&compress,merge]{natbib} -\\bibpunct[, ]{(}{)}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont} -\\renewcommand\\citenumfont[1]{\\textit{#1}} -\\renewcommand\\bibnumfmt[1]{(#1)}" + cmd = c( + "\\usepackage[numbers,sort&compress,merge]{natbib}", + "\\bibpunct[, ]{(}{)}{,}{n}{,}{,}", + "\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}", + "\\renewcommand\\citenumfont[1]{\\textit{#1}}", + "\\renewcommand\\bibnumfmt[1]{(#1)}" + ) ), TFQ = list( bst = "tfq", - cmd = "\\usepackage[numbers,sort&compress]{natbib} -\\bibpunct[, ]{[}{]}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + cmd = c( + "\\usepackage[numbers,sort&compress]{natbib}", + "\bibpunct[, ]{[}{]}{,}{n}{,}{,}", + "\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ) ), TFS = list( bst = "tfs", - cmd = "\\usepackage[numbers,sort&compress]{natbib} -\\bibpunct[, ]{[}{]}{,}{n}{,}{,} -\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + cmd = c( + "\\usepackage[numbers,sort&compress]{natbib}", + "\bibpunct[, ]{[}{]}{,}{n}{,}{,}", + "\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + ) ) ) biblio_style <- match.arg(biblio_style) @@ -80,7 +92,10 @@ tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", pandoc_args <- c( pandoc_args, rmarkdown::pandoc_variable_arg("bst-name", sty$bst), - rmarkdown::pandoc_variable_arg("biblio-commands", sty$cmd) + rmarkdown::pandoc_variable_arg( + "biblio-commands", + paste(sty$cmd, collapse = "\n") + ) ) pdf_document_format( "tf", From 0b368f1e486a04f613759d4673b28088430e0104 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Fri, 13 Dec 2024 01:03:09 +0100 Subject: [PATCH 15/29] Add myself as contributor --- DESCRIPTION | 4 +++- man/rticles-package.Rd | 1 + 2 files changed, 4 insertions(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index 767d28788..dd2428566 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -79,7 +79,9 @@ Authors@R: c( person("Dmytro", "Perepolkin", , "dperepolkin@gmail.com", role = "ctb", comment = c(ORCID = "0000-0001-8558-6183", github = "dmi3kno")), person("Tom", "Palmer", , "remlapmot@hotmail.com", role = "ctb", - comment = c(ORCID = "0000-0003-4655-4511", github = "remlapmot")) + comment = c(ORCID = "0000-0003-4655-4511", github = "remlapmot")), + person("Rafael", "Laboissière", , "rafael@laboissiere.net", role = "ctb", + comment = c(ORCID = "0000-0002-2180-9250", github = "rlaboiss")) ) Description: A suite of custom R Markdown formats and templates for authoring journal articles and conference submissions. diff --git a/man/rticles-package.Rd b/man/rticles-package.Rd index e4725d605..dc1dcbabe 100644 --- a/man/rticles-package.Rd +++ b/man/rticles-package.Rd @@ -78,6 +78,7 @@ Other contributors: \item Callum Arnold \email{cal.rk.arnold@gmail.com} (arnold-c) [contributor] \item Dmytro Perepolkin \email{dperepolkin@gmail.com} (\href{https://orcid.org/0000-0001-8558-6183}{ORCID}) (dmi3kno) [contributor] \item Tom Palmer \email{remlapmot@hotmail.com} (\href{https://orcid.org/0000-0003-4655-4511}{ORCID}) (remlapmot) [contributor] + \item Rafael Laboissière \email{rafael@laboissiere.net} (\href{https://orcid.org/0000-0002-2180-9250}{ORCID}) (rlaboiss) [contributor] } } From bbf912344c9a235ad3cd09a577419e34e0aa2ed0 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Fri, 13 Dec 2024 10:53:36 +0100 Subject: [PATCH 16/29] Deprecate the biblio_style option and rename the reference_style option MIME-Version: 1.0 Content-Type: text/plain; charset=UTF-8 Content-Transfer-Encoding: 8bit This commit is intended to eliminate an ambiguity linked to the use of biblio_style as the name of the tf_article function option. In fact, biblio_style is traditionally used in the rticles package to indicate the name of the .bst file that will be used as an argument to the \bibliographystyle command in the LaTeX template. The new version of tf_article accepts an option that determines the Taylor & Francis reference style to be used. Until now, the name biblio_style was used as the name of this option. In this commit, this name is changed to reference_style. This not only aligns with the terminology used by Francis & Taylor (“Reference Style”), but also avoids any confusion on the part of the user. The tf_article function has also been modified to include a pre_knit function, in which the presence of the biblio_style in the YAML header is checked. If present, a warning message is issued concerning the depreciation of the biblio_style field. --- R/tf_article.R | 32 +++++++++++++------ .../templates/tf/resources/template.tex | 2 +- .../templates/tf/skeleton/skeleton.Rmd | 6 ++-- man/tf_article.Rd | 6 ++-- 4 files changed, 29 insertions(+), 17 deletions(-) diff --git a/R/tf_article.R b/R/tf_article.R index 9cdcf82b5..2e10340f8 100644 --- a/R/tf_article.R +++ b/R/tf_article.R @@ -10,7 +10,7 @@ #' * #' #' @inheritParams rmarkdown::pdf_document -#' @param biblio_style should be set according to the specific Taylor & Francis +#' @param reference_style should be set according to the specific Taylor & Francis #' journal. Possibles values: "APA" (American Psychological Association #' reference style), "CAD" (Chicago Author-Date reference style), "NLM" #' (National Library of Medicine reference style), "TFP" (Reference @@ -18,13 +18,13 @@ #' @param ... Additional arguments to [rmarkdown::pdf_document()] #' #' @examples \dontrun{ -#' rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", biblio_style = "APA") +#' rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", reference_style = "APA") #' rmarkdown::render("MyArticle.Rmd") #' } #' @importFrom rmarkdown pandoc_variable_arg #' @export tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", - biblio_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS"), + reference_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS"), pandoc_args = NULL) { styles <- list( APA = list( @@ -80,29 +80,41 @@ tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", ) ) ) - biblio_style <- match.arg(biblio_style) - if (! biblio_style %in% names(styles)) + reference_style <- match.arg(reference_style) + if (! reference_style %in% names(styles)) stop( paste( - "Invalid biblio_style in Taylor and Francis article. Allowed values are:", + "Invalid reference_style in Taylor and Francis article. Allowed values are:", paste(names(styles), collapse = ", ") ) ) - sty <- styles[[biblio_style]] + sty <- styles[[reference_style]] pandoc_args <- c( pandoc_args, - rmarkdown::pandoc_variable_arg("bst-name", sty$bst), + rmarkdown::pandoc_variable_arg("biblio-style", sty$bst), rmarkdown::pandoc_variable_arg( "biblio-commands", paste(sty$cmd, collapse = "\n") ) ) - pdf_document_format( + + base <- pdf_document_format( "tf", keep_tex = keep_tex, citation_package = citation_package, pandoc_args = pandoc_args, ... ) -} + pre_knit <- base$pre_knit + # Alert the user about deprecation of the biblio_style field in the YAML header + base$pre_knit <- function(input, metadata, ...) { + if (is.function(pre_knit)) pre_knit(input, metadata, ...) + if (!is.null(metadata$biblio_style)) + warning("`tf_article()` now ignores the 'biblio_style' field in YAML header. ", + " Use the 'reference_style' option of 'output:tf_article', instead.", + call. = FALSE) + } + + base +} diff --git a/inst/rmarkdown/templates/tf/resources/template.tex b/inst/rmarkdown/templates/tf/resources/template.tex index d241d8e5e..e1f7a69d7 100644 --- a/inst/rmarkdown/templates/tf/resources/template.tex +++ b/inst/rmarkdown/templates/tf/resources/template.tex @@ -197,7 +197,7 @@ $body$ $if(bibliography)$ -\bibliographystyle{$bst-name$} +\bibliographystyle{$biblio-style$} \bibliography{$bibliography$} $endif$ diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index a90f2e2cb..5fd958664 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -44,7 +44,7 @@ header-includes: | \def\tightlist{} output: rticles::tf_article: - biblio_style: CAD + reference_style: CAD --- # Introduction @@ -398,12 +398,12 @@ Authors must specify the required reference style in the YAML header of this fil ``` output: rticles::tf_article: - biblio_style: CAD + reference_style: CAD ``` ## References cited in the text -[CAVEAT: The only subsection below that will be correctly typeset is the one corresponding to the value specified in the `biblio_style` field of the YAML header.] +[CAVEAT: The only subsection below that will be correctly typeset is the one corresponding to the value specified in the `reference_style` field of the YAML header.] ### American Psychological Association reference style (APA) diff --git a/man/tf_article.Rd b/man/tf_article.Rd index 0f1765049..fe58c3563 100644 --- a/man/tf_article.Rd +++ b/man/tf_article.Rd @@ -8,7 +8,7 @@ tf_article( ..., keep_tex = TRUE, citation_package = "natbib", - biblio_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS"), + reference_style = c("CAD", "APA", "NLM", "TFP", "TFQ", "TFS"), pandoc_args = NULL ) } @@ -26,7 +26,7 @@ or \code{biblatex}. Use \code{default} if neither package is to be used, which means citations will be processed via the command \command{pandoc-citeproc}.} -\item{biblio_style}{should be set according to the specific Taylor & Francis +\item{reference_style}{should be set according to the specific Taylor & Francis journal. Possibles values: "APA" (American Psychological Association reference style), "CAD" (Chicago Author-Date reference style), "NLM" (National Library of Medicine reference style), "TFP" (Reference @@ -48,7 +48,7 @@ Adapted from: } \examples{ \dontrun{ -rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", biblio_style = "APA") +rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", reference_style = "APA") rmarkdown::render("MyArticle.Rmd") } } From b23d6bddb75a1cb9b56b4fdc9e29809fba1e4e5e Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Fri, 13 Dec 2024 12:02:33 +0100 Subject: [PATCH 17/29] Indicate the origin sources --- inst/rmarkdown/templates/tf/resources/template.tex | 10 ++++++++++ 1 file changed, 10 insertions(+) diff --git a/inst/rmarkdown/templates/tf/resources/template.tex b/inst/rmarkdown/templates/tf/resources/template.tex index e1f7a69d7..861e24633 100644 --- a/inst/rmarkdown/templates/tf/resources/template.tex +++ b/inst/rmarkdown/templates/tf/resources/template.tex @@ -1,3 +1,13 @@ +% Template for Taylor & Francis journals +% +% Based on the original files distributed by T&F: +% * interactapasample.tex: v1.05 - August 2017 +% * interactcadsample.tex: v1.04 - May 2023 +% * interactnlmsample.tex: v1.05 - August 2017 +% * interacttfpsample.tex: v1.01 - June 2016 +% * interacttfqsample.tex: v1.05 - August 2017 +% * interacttfssample.tex: v1.05 - August 2017 + \documentclass[$for(classoption)$$classoption$$sep$,$endfor$]{interact} \usepackage{epstopdf}% To incorporate .eps illustrations using PDFLaTeX, etc. From db2d5cba6ebd66c6ad6656c14b509cca2246a748 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Fri, 13 Dec 2024 17:57:49 +0100 Subject: [PATCH 18/29] Fix example --- R/tf_article.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/R/tf_article.R b/R/tf_article.R index 2e10340f8..4dcb1aad2 100644 --- a/R/tf_article.R +++ b/R/tf_article.R @@ -18,7 +18,7 @@ #' @param ... Additional arguments to [rmarkdown::pdf_document()] #' #' @examples \dontrun{ -#' rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", reference_style = "APA") +#' rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles") #' rmarkdown::render("MyArticle.Rmd") #' } #' @importFrom rmarkdown pandoc_variable_arg From 62f646720a67e18faaa66f78a1d208609f4c5f5e Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 06:34:43 +0100 Subject: [PATCH 19/29] Propagate fix into documentation file --- man/tf_article.Rd | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/man/tf_article.Rd b/man/tf_article.Rd index fe58c3563..3bcd33391 100644 --- a/man/tf_article.Rd +++ b/man/tf_article.Rd @@ -48,7 +48,7 @@ Adapted from: } \examples{ \dontrun{ -rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles", reference_style = "APA") +rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles") rmarkdown::render("MyArticle.Rmd") } } From acee0db4c00f75573d5b2b8b14cdc6996057c2e1 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 06:37:43 +0100 Subject: [PATCH 20/29] Provide a working example in the documentation --- R/tf_article.R | 1 + 1 file changed, 1 insertion(+) diff --git a/R/tf_article.R b/R/tf_article.R index 4dcb1aad2..e9a5202f9 100644 --- a/R/tf_article.R +++ b/R/tf_article.R @@ -19,6 +19,7 @@ #' #' @examples \dontrun{ #' rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles") +#' setwd("MyArticle") #' rmarkdown::render("MyArticle.Rmd") #' } #' @importFrom rmarkdown pandoc_variable_arg From 49b92e1823d316491a03ef11c9fed4665129cc1f Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 06:48:37 +0100 Subject: [PATCH 21/29] Propagate fix into documentation file --- man/tf_article.Rd | 1 + 1 file changed, 1 insertion(+) diff --git a/man/tf_article.Rd b/man/tf_article.Rd index 3bcd33391..7bf0b0abb 100644 --- a/man/tf_article.Rd +++ b/man/tf_article.Rd @@ -49,6 +49,7 @@ Adapted from: \examples{ \dontrun{ rmarkdown::draft("MyArticle.Rmd", template = "tf", package = "rticles") +setwd("MyArticle") rmarkdown::render("MyArticle.Rmd") } } From 74e81c5aa52569f5dd36c6439effb6705d72b6b2 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 06:49:29 +0100 Subject: [PATCH 22/29] =?UTF-8?q?Fix=20word=20"below"=20=E2=87=92=20"above?= =?UTF-8?q?"?= MIME-Version: 1.0 Content-Type: text/plain; charset=UTF-8 Content-Transfer-Encoding: 8bit --- inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index 5fd958664..148b3f452 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -455,6 +455,6 @@ Authors should create the list of references using a \textsc{Bib}\TeX\ database. - TFQ: `tfq.bst` - TFS: `tfs.bst` -Besides from `apacite.bst`, which is part of standard \LaTeX\ distributions, the files listed below should have been installed in the same directory of this skeleton file. You may delete the ones that are not needed. +Besides from `apacite.bst`, which is part of standard \LaTeX\ distributions, the files listed above should have been installed in the same directory of this skeleton file. You may delete the ones that are not needed. Please include a copy of your .bib file and/or the final generated .bbl file among your source files. From 4af845ffc9be1bdf2f7726eb8ed2050c2f07a5fd Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 07:35:33 +0100 Subject: [PATCH 23/29] Appropriately escape backslashes in strings --- R/tf_article.R | 8 ++++---- 1 file changed, 4 insertions(+), 4 deletions(-) diff --git a/R/tf_article.R b/R/tf_article.R index e9a5202f9..698283704 100644 --- a/R/tf_article.R +++ b/R/tf_article.R @@ -68,16 +68,16 @@ tf_article <- function(..., keep_tex = TRUE, citation_package = "natbib", bst = "tfq", cmd = c( "\\usepackage[numbers,sort&compress]{natbib}", - "\bibpunct[, ]{[}{]}{,}{n}{,}{,}", - "\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + "\\bibpunct[, ]{[}{]}{,}{n}{,}{,}", + "\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" ) ), TFS = list( bst = "tfs", cmd = c( "\\usepackage[numbers,sort&compress]{natbib}", - "\bibpunct[, ]{[}{]}{,}{n}{,}{,}", - "\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" + "\\bibpunct[, ]{[}{]}{,}{n}{,}{,}", + "\\renewcommand\\bibfont{\\fontsize{10}{12}\\selectfont}" ) ) ) From a0ac4c42be75c7d9bc964b0560a90e02bac3c562 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 07:59:03 +0100 Subject: [PATCH 24/29] Reduce the amount of entries in the BibTeX file to the minimum necessary --- .../templates/tf/skeleton/interactsample.bib | 1623 ----------------- .../templates/tf/skeleton/skeleton.Rmd | 16 +- 2 files changed, 8 insertions(+), 1631 deletions(-) diff --git a/inst/rmarkdown/templates/tf/skeleton/interactsample.bib b/inst/rmarkdown/templates/tf/skeleton/interactsample.bib index 15d917ef7..997b857eb 100644 --- a/inst/rmarkdown/templates/tf/skeleton/interactsample.bib +++ b/inst/rmarkdown/templates/tf/skeleton/interactsample.bib @@ -1,10 +1,3 @@ -@PHDTHESIS{Adams1973, - author = {Adams, R. J.}, - year = 1973, - title = {Building a Foundation for Evaluation of Instruction in Higher Education and Continuing Education}, - type = {Doctoral dissertation}, - url = {http://www.ohiolink.edu/etd/}} - @BOOK{APA10, author = {{American Psychological Association}}, year = 2010, @@ -20,14 +13,6 @@ @BOOK{Ban77 address = {Englewood Cliffs, NJ}, publisher = {Prentice Hall}} -@ARTICLE{Bar91, - editor = {Barlow, D. H.}, - year = 1991, - title = {Diagnoses, Dimensions, and {DSM-IV} [{S}pecial issue]}, - journal = {Journal of Abnormal Psychology}, - volume = 100, - number = 3} - @ARTICLE{BriIP, author = {Briscoe, R.}, year = {in press}, @@ -35,14 +20,6 @@ @ARTICLE{BriIP journal = {Philosophy and Phenomenological Research}, url = {http://cogprints.org/5780/1/ECSRAP.F07.pdf}} -@NEWSPAPER{Bro07, - author = {Brody, J. E.}, - year = 2007, - month = dec # "~11", - title = {Mental Reserves Keep Brain Agile}, - journal = {The New York Times}, - url = {http://www.nytimes.com}} - @ARTICLE{Cha08, author = {Chamberlin, J. and Novotney, A. and Packard, E. and Price, M.}, year = 2008, @@ -63,25 +40,6 @@ @ARTICLE{Cla08 number = 6, url = {http://www.apa.org/monitor/}} -@ARTICLE{Edi06, - key = {Editorial}, - title = {Editorial: ``{W}hat is a Disaster'' and Why does this Question Matter?}, - type = {Editorial}, - year = 2006, - journal = {Journal of Contingencies and Crisis Management}, - volume = 14, - pages = {1--2}} - -@TECHREPORT{EBRI92, - author = {{Employee Benefit Research Institute}}, - year = 1992, - month = feb, - title = {Sources of Health Insurance and Characteristics of the Uninsured}, - type = {Issue Brief}, - number = {123}, - address = {Washington, DC}, - institution = {{Employee Benefit Research Institute}}} - @TECHREPORT{Fel81, author = {B. A. Feller}, title = {Health Characteristics of Persons with Chronic Activity Limitation, {U}nited {S}tates, 1979}, @@ -100,15 +58,6 @@ @ARTICLE{GSSM91 volume = 76, pages = {143--168}} -@ARTICLE{Gil04, - author = {Gilbert, David G. and McClernon, F. Joseph and Rabinovich, Norka E. and Chihiro Sugai and Louisette C. Plath and Greg Asgaard and Yantao Zuo and Jodi Huggenvik and Nazeih Botros}, - year = 2004, - title = {Effects of quitting smoking on {EEG} activation and attention last for more than 31 days and are more severe with stress, dependence, {DRD2 A1} allele, and depressive traits}, - journal = {Nicotine and Tobacco Research}, - volume = 6, - pages = {249--267}, - doi = {10.1080/14622200410001676305}} - @INCOLLECTION{Gra05, author = {Graham, G.}, year = 2005, @@ -118,24 +67,6 @@ @INCOLLECTION{Gra05 edition = {Fall 2007}, url = {http://plato.stanford.edu/entries/behaviorism}} -@ARTICLE{Gre06, - editor = {Greenfield, P. and Yan, Z.}, - year = 2006, - title = {Children, Adolescents, and the {I}nternet}, - type = {Special section}, - journal = {Developmental Psychology}, - volume = 42, - pages = {391--458}} - -@ARTICLE{Gui07, - author = {Guimard, P. and Florin, A.}, - title = {Les {\'e}valuations des enseignants en grande section de maternelle sont-elles pr{\'e}dictives des difficult{\'e}s de lecture au cours pr{\'e}paratoire?}, - englishtitle = {Are teacher ratings in kindergarten predictive of reading difficulties in first grade?}, - journal = {Approche Neuropsychologique des Apprentissages chez l'Enfant}, - year = 2007, - volume = 19, - pages = {5--17}} - @ARTICLE{Han04, editor = {Haney, C. and Wiener, R. L.}, year = 2004, @@ -155,50 +86,6 @@ @INCOLLECTION{Hay08 address = {New York, NY}, publisher = {Guilford Press}} -@ARTICLE{HDK05, - author = {Herbst-Damm, K. L. and Kulik, J. A.}, - year = 2005, - title = {Volunteer Support, Marital Status, and the Survival Times of Terminally Ill Patients}, - journal = {Health Psychology}, - volume = 24, - pages = {225--229}} - -@ARTICLE{Jan76, - author = {Janet, Paul}, - year = 1876, - title = {La notion de la personnalit{\'e}}, - englishtitle = {The Notion of Personality}, - journal = {Revue Scientifique}, - volume = 10, - pages = {574--575}} - -@ARTICLE{Jan06, - author = {Janet, Pierre}, - year = 1906, - title = {The Pathogenesis of Some Impulsions}, - journal = {Journal of Abnormal Psychology}, - volume = 1, - pages = {1--17}} - -@INCOLLECTION{KGA07, - author = {I. Katz and K. Gabayan and H. Aghajan}, - year = 2007, - title = {A Multi-touch Surface Using Multiple Cameras}, - editor = {J. Blanc-Talon and W. Philips and D. Popescu and P. Scheunders}, - booktitle = {Lecture Notes in Computer Science: Vol. 4678. {A}dvanced Concepts for Intelligent Vision Systems}, - pages = {97--108}, - address = {Berlin}, - publisher = {Springer-Verlag}} - -@TECHREPORT{Kes06, - author = {Kessy, S. S. A. and Urio, F. M.}, - year = 2006, - title = {The Contribution of Microfinance Institutions to Poverty Reduction in {T}anzania}, - type = {Research Report}, - number = {06.3}, - institution = {}, - URL = {\textrm{Research on Poverty Alleviation website:} http://www.repoa.or.tz/documents\_storage/Publications/Reports/06.3\_Kessy\_and\_Urio.pdf}} - @BOOK{Koc59, editor = {S. Koch}, year = {1959--1963}, @@ -207,16 +94,6 @@ @BOOK{Koc59 address = {New York, NY}, publisher = {McGraw-Hill}} -@INPROCEEDINGS{Lee03, - author = {D. J. Lee and D. Bates and C. Dromey and X. Xu and S. Antani}, - title = {An Imaging System Correlating Lip Shapes with Tongue Contact Patterns for Speech Pathology Research}, - editor = {M. Krol and S. Mitra and D. J. Lee}, - booktitle = {{CMBS} 2003. {P}roceedings of the 16th {IEEE} Symposium on Computer-Based Medical Systems}, - month = jun, - year = 2003, - pages = {307--313}, - publisher = {Los Alamitos, CA: IEEE Computer Society}} - @BOOK{Lig06, author = {Light, I.}, year = 2006, @@ -233,19 +110,6 @@ @ARTICLE{Lig08 number = 1, pages = {73--82}} -@PRESENTATION{Liu05, - author = {Liu, S.}, - year = 2005, - title = {Defending against business crises with the help of intelligent agent based early warning solutions}, - howpublished = {Paper presented at the Seventh International Conference on Enterprise Information Systems, Miami, FL}, - month = may} - -@MASTERSTHESIS{McN06, - author = {McNiel, D. S.}, - year = 2006, - title = {Meaning Through Narrative: A Personal Narrative Discussing Growing Up with an Alcoholic Mother}, - note = {Available from ProQuest Dissertations and Theses database. (UMI No. 1434728)}} - @ARTICLE{MPW08, author = {Marshall-Pescini, S. and Whiten, A.}, year = 2008, @@ -293,15 +157,6 @@ @BOOK{PI51 address = {Paris}, publisher = {Presses Universitaires de France}} -@BOOK{REA01, - author = {{Real Academia Espa{\~n}ola}}, - year = 2001, - title = {Diccionario de la lengua espa{\~n}ola}, - englishtitle = {Dictionary of the {S}panish Language}, - edition = 22, - address = {Madrid}, - publisher = {{Real Academia Espa{\~n}ola}}} - @PHDTHESIS{Rit74, author = {R. E. Ritzmann}, title = {The Snapping Mechanism of \emph{Alpheid} Shrimp}, @@ -326,30 +181,6 @@ @NEWSPAPER{Sch93 journal = {The Washington Post}, pages = {A1, A4}} -@ARTICLE{Sil06, - author = {Sillick, T. J. and Schutte, N. S.}, - year = 2006, - title = {Emotional Intelligence and Self-Esteem Mediate between Perceived Early Parental Love and Adult Happiness}, - journal = {E-Journal of Applied Psychology}, - volume = 2, - number = 2, - pages = {38--48}, - url = {http://ojs.lib.swin.edu.au/index.php/ejap}} - -@BOOK{Tho02, - editor = {N. Thomas}, - title = {Perspectives on the Community College: A Journey of Discovery}, - type = {Monograph}, - url = {http://eric.ed.gov/}, - year = 2002} - -@BOOK{VdB07, - editor = {VandenBos, G. R.}, - year = 2007, - title = {{APA} Dictionary of Psychology}, - address = {Washington, DC}, - publisher = {American Psychological Association}} - @ARTICLE{VL07, author = {Von Ledebur, S. C.}, year = 2007, @@ -357,124 +188,6 @@ @ARTICLE{VL07 journal = {Knowledge Management Research \& Practice}, howpublished = {Advance online publication. doi:10.1057/palgrave/kmrp.8500141}} -@ARTICLE{Woo91, - author = {Woolf, N. J. and Young, S. L. and Fanselow, M. S. and Butcher, L. L.}, - year = 1991, - title = {{MAP}-2 Expression in Cholinoceptive Pyramidal Cells of Rodent Cortex and Hippocampus is Altered by {P}avlovian Conditioning [{A}bstract]}, - journal = {Society for Neuroscience Abstracts}, - volume = 17, - pages = 480} - -@ARTICLE{Alb05, - author = {Albiston, Catherine R.}, - year = 2005, - title = {Bargaining in the Shadow of Social Institutions: Competing Discourses and Social Change in the Workplace Mobilization of Civil Rights}, - journal = {Law and Society Review}, - volume = 39, - number = 1, - pages = {11--47}, - doi = {10.1111/j.0023-9216.2005.00076.x}} - -@ARTICLE{Blair1977, - author = {Blair, Walter}, - year = 1977, - title = {Americanized Comic Braggarts}, - journal = {Critical Inquiry}, - volume = 4, - number = 2, - pages = {331--349}, - doi = {10.1086/447940}} - -@BOOK{Bro02, - author = {Brooks, Daniel R. and McLennan, Deborah A.}, - title = {The Nature of Diversity: An Evolutionary Voyage of Discovery}, - address = {Chicago}, - publisher = {University of Chicago Press}, - year = 2002} - -@BOOK{Bro86, - author = {Brooks, Daniel R. and Wiley, E. O.}, - title = {Evolution as Entropy}, - edition = {Second}, - address = {Chicago}, - publisher = {University of Chicago Press}, - year = 1986} - -@PRESENTATION{Bunn2018, - author = {Bunn, Matthew and Anna Bennett and Penny Jane Burke}, - year = 2018, - title = {Temporalities of Trust and Betrayal: Teaching and Learning in the Neoliberal University}, - organization = {Paper presented at the Society for Research in Higher Education Annual Research Conference}, - month = dec, - address = {Newport, UK}} - -@PHDTHESIS{Cho08, - author = {Choi, Mihwa}, - year = 2008, - title = {Contesting \emph{Imaginaires} in Death Rituals during the Northern {S}ong Dynasty}, - school = {University of Chicago}, - url = {http://pi.lib.uchicago.edu/1001/cat/bib/6820707}} - -@ARTICLE{ChoGul08, - author = {Choi, Stephen J. and Gulati, G. Mitu}, - year = 2008, - title = {Bias in Judicial Citations: A Window into the Behavior of Judges?}, - journal = {Journal of Legal Studies}, - volume = 37, - number = {1}, - pages = {87--129}, - doi = {10.2139/ssrn.913663}} - -@INCOLLECTION{Draper1987, - author = {Draper, Joan E.}, - year = 1987, - title = {Paris by the Lake: Sources of {B}urnham's Plan of {C}hicago}, - booktitle = {Chicago Architecture, 1872--1922: Birth of a Metropolis}, - editor = {John Zukowsky}, - pages = {107--119}, - address = {Munich}, - publisher = {Prestel-Verlag in association with the Art Institute of Chicago}} - -@ARTICLE{Edelman1992, - author = {Lauren B. Edelman}, - title = {Legal Ambiguity and Symbolic Structures: Organizational Mediation of Civil Rights Law}, - journal = {American Journal of Sociology}, - year = 1992, - volume = 97, - number = 6, - pages = {1531--1576}, - doi = {10.1086/229939}} - -@ARTICLE{EdelmanFullerMara2001, - author = {Lauren B. Edelman and Sally Riggs Fuller and Iona Mara-Drita}, - title = {Diversity Rhetoric and the Managerialization of the Law}, - journal = {American Journal of Sociology}, - year = 2001, - volume = 106, - number = 6, - pages = {1589--1641}, - doi = {10.1086/321303}} - -@ARTICLE{EdelmanUggenErlanger1999, - author = {Lauren B. Edelman and Christopher Uggen and Howard S. Erlanger}, - title = {The Endogeneity of Legal Regulation: Grievance Procedures as Rational Myth}, - journal = {American Journal of Sociology}, - year = 1999, - volume = 105, - number = 2, - pages = {406--454}, - doi = {10.1086/210316}} - -@INCOLLECTION{Ell1968, - author = {Ellet, Elizabeth F. L.}, - title = {By Rail and Stage to Galena}, - booktitle = {Prairie State: Impressions of {I}llinois, 1673--1967, by Travelers and Other Observers}, - editor = {Paul M. Angle}, - pages = {271--279}, - address = {Chicago}, - publisher = {University of Chicago Press}, - year = 1968} - @BOOK{FogEHPD04, author = {Robert William Fogel}, year = 2004, @@ -492,194 +205,6 @@ @ARTICLE{FogJEE04 pages = {217--221}, doi = {10.1007/s00191-004-0188-x}} -@BOOK{Fow89, - author = {Fowler, Melvin L.}, - title = {The {C}ahokia Atlas: A Historical Atlas of {C}ahokia Archaeology}, - publisher = {Illinois Historic Preservation Agency}, - address = {Springfield}, - series = {Studies in Illinois Archaeology}, - number = 6, - year = 1989} - -@INCOLLECTION{Gould1984, - author = {Gould, Glenn}, - year = 1984, - title = {Streisand as {S}chwarzkopf}, - booktitle = {The {G}lenn {G}ould Reader}, - editor = {Tim Page}, - pages = {308--311}, - address = {New York}, - publisher = {Vintage}} - -@BOOK{Gre08, - editor = {Greenberg, Joel}, - year = 2008, - title = {Of Prairie, Woods, and Water: Two Centuries of {C}hicago Nature Writing}, - address = {Chicago}, - publisher = {University of Chicago Press}} - -@INCOLLECTION{Harrington1987, - author = {Harrington, Elaine}, - year = 1987, - title = {International Influences on {H}enry {H}obson {R}ichardson's {G}lessner {H}ouse}, - booktitle = {Chicago Architecture, 1872--1922: Birth of a Metropolis}, - editor = {John Zukowsky}, - pages = {189--207}, - address = {Munich}, - publisher = {Prestel-Verlag in association with the Art Institute of Chicago}} - -@ONLINE{HarrisZucker2015, -author = {Harris, Beth and Steven Zucker}, -year = 2015, -title = {Haussmann the Demolisher and the Creation of Modern Paris}, -organization = {Smarthistory}, -url = {https://smarthistory.org/haussmann-the-demolisher-and-the-creation-of-modern-paris}} - -@BOOK{Heinrich2008, - author = {Heinrich, Larissa}, - year = 2008, - title = {The Afterlife of Images: Translating the Pathological Body between {C}hina and the {W}est}, - address = {Durham, NC}, - publisher = {Duke University Press}} - -@BOOK{Jacobs1997, - editor = {Jacobs, Sue-Ellen and Wesley Thomas and Sabine Lang}, - title = {Two-Spirit People: {N}ative {A}merican Gender Identity, Sexuality, and Spirituality}, - address = {Urbana}, - publisher = {University of Illinois Press}, - year = 1997} - -@INCOLLECTION{Kelly2010, - author = {Kelly, John D.}, - year = 2010, - title = {Seeing Red: {M}ao Fetishism, {P}ax {A}mericana, and the Moral Economy of War}, - booktitle = {Anthropology and Global Counterinsurgency}, - editor = {John D. Kelly and Beatrice Jauregui and Sean T. Mitchell and Jeremy Walton}, - pages = {67--83}, - address = {Chicago}, - publisher = {University of Chicago Press}} - -@BOOK{Kogan1974, - author = {Kogan, Herman}, - title = {The First Century: The {C}hicago {B}ar {A}ssociation, 1874--1974}, - address = {Chicago}, - publisher = {Rand McNally}, - year = 1974} - -@BOOK{KoganWendt1958, - author = {Kogan, Herman and Wendt, Lloyd}, - title = {Chicago: A Pictorial History}, - address = {New York}, - publisher = {Dutton}, - year = 1958} - -@BOOK{Lev05, - author = {Levitt, Steven D. and Stephen J. Dubner}, - title = {Freakonomics: A Rogue Economist Explores the Hidden Side of Everything}, - address = {New York}, - publisher = {William Morrow}, - year = 2005} - -@ARTICLE{Mno79, - author = {Mnookin, Robert and Lewis Kornhauser}, - title = {Bargaining in the Shadow of the Law: The Case of Divorce}, - journal = {Yale Law Journal}, - year = 1979, - volume = 88, - number = 5, - pages = {950--997}, - doi = {10.2307/795824}} - -@ARTICLE{Mor08, - author = {Morasse, S{\'e}bastien and Helga Guderley and Julian J. Dodson}, - title = {Paternal Reproductive Strategy Influences Metabolic Capacities and Muscle Development of {A}tlantic Salmon (\emph{Salmo salar} L.) Embryos}, - journal = {Physiological and Biochemical Zoology}, - year = 2008, - volume = 81, - number = 4, - pages = {402--413}, -doi = {10.1086/589012}} - -@ARTICLE{Nowacki20, - author = {Nowacki, J. S. and D. Creech and M. Parks}, - year = 2020, - title = {Political Climate, Voter Suppression Policies and Federal Sentencing Outcomes}, - journal = {British Journal of Criminology}, - volume = 60, - number = 5, - pages = {1115--1180}, - doi = {10.1093/bjc/azaa017}} - -@BOOK{Pelikan1971, - author = {Pelikan, Jaroslav}, - title = {The Emergence of the Catholic Tradition (100--600)}, - volume = {1}, - series = {The {C}hristian Tradition: A History of the Development of Doctrine}, - address = {Chicago}, - publisher = {University of Chicago Press}, - year = 1971} - -@INCOLLECTION{Piaget1995, - author = {Piaget, Jean}, - year = 1995, - title = {Logical Operators and Social Life}, - translator = {Wolfe Mays}, - booktitle = {Sociological Studies}, - editor = {Leslie Smith}, - pages = {134--157}, - address = {Hove, UK}, - publisher = {Routledge}} - -@BOOK{Pollan2006, - author = {Pollan, Michael}, - year = 2006, - title = {The Omnivore's Dilemma: A Natural History of Four Meals}, - address = {New York}, - publisher = {Penguin}} - -@ARTICLE{Prinzie09, - author = {Prinzie, Peter and Geert Jan J. M. Stams and Maja Dekovi{\'c} and Albert H. A. Reijntjes and Jay Belsky}, - year = 2009, - title = {The Relations between Parents' Big Five Personality Factors and Parenting: A Meta-analytic Review}, - journal = {Journal of Personality and Social Psychology}, - volume = 97, - number = 2, - pages = {351--362}, - doi = {10.1037/a0015823}} - -@ARTICLE{Sch87, - author = {Schuman, Howard and Jacqueline Scott}, - year = 1987, - title = {Problems in the Use of Survey Questions to Measure Public Opinion}, - journal = {Science}, - volume = 236, - number = 4804, - pages = {957--959}, - doi = {10.1126/science.236.4804.957}} - -@ARTICLE{Sch89, - author = {Schuman, Howard and Jacqueline Scott}, - year = 1989, - title = {Generations and Collective Memories}, - journal = {American Sociological Review}, - volume = 54, - number = 3, - pages = {359--381}, - doi = {10.2307/2095611}} - -@BOOK{Sol99, - editor = {Soltes, Ori Z.}, - year = 1999, - title = {Georgia: Art and Civilization through the Ages}, - address = {London}, - publisher = {Philip Wilson}} - -@UNPUBLISHED{Stearns1864, - author = {Stearns, A. A.}, - title = {Armory {S}quare {H}ospital Nursing Diary}, - year = 1864, - note = {MS B 372. History of Medicine Division. National Library of Medicine, Bethesda, MD}} - @BOOK{Str00, author = {Strunk, Jr., William and E. B. White}, title = {The Elements of Style}, @@ -688,694 +213,6 @@ @BOOK{Str00 publisher = {Allyn and Bacon}, year = 2000} -@BOOK{VanWagenen1973, - author = {Van Wagenen, Gertrude and Miriam E. Simpson}, - title = {Postnatal Development of the Ovary in \emph{Homo sapiens} and \emph{Macaca mulatta} and Induction of Ovulation in the Macaque}, - address = {New Haven, CT}, - publisher = {Yale University Press}, - year = 1973} - -@PRESENTATION{Wagmiller18, - author = {Wagmiller, R. L. and K. LaParo and D. Schrider and R, Wildfeuer and M. Ford and S. M. Hitchcock}, - year = 2018, - title = {Attitudes towards Interracial Marriage in a Diverse and Unequal Metropolis: A Lost Letter Study}, - organization = {Poster presented at the American Sociological Association 113th Annual Meeting}, - month = aug, - address = {Philadelphia, PA}} - -@BOOK{Wau50, - author = {Robert Wauchope}, - title = {A Tentative Sequence of Pre-Classic Ceramics in Middle {A}merica}, - publisher = {Tulane University}, - year = 1950, - volume = 1, - series = {Middle {A}merican Research Records}, - address = {New Orleans, LA}} - -@BOOK{Weber2020, - author = {Weber, Max}, - title = {Politik als Beruf \emph{[Politics as vocation]}}, - edition = {11th}, - address = {Berlin}, - publisher = {Duncker \& Humblot}, - year = {2010}} - -@BOOK{Wei02, - author = {Weigel, Detlef and Jane Glazebrook}, - title = {Arabidopsis: A Laboratory Manual}, - address = {Cold Spring Harbor, NY}, - publisher = {Cold Spring Harbor Laboratory Press}, - year = 2002} - -@BOOK{Wittgenstein2009, - author = {Wittgenstein, Ludwig}, - title = {Philosophical Investigations}, - translator = {Anscombe, G. E. M. and P. M. S. Hacker and Joachim Schulte}, - edition = {4th}, - address = {Oxford}, - publisher = {Wiley--Blackwell}, - year = 2009} - -@BOOK{Woodward1977, - author = {David Woodward}, - title = {The All-{A}merican Map: Wax Engraving and Its Influence on Cartography}, - publisher = {University of Chicago Press}, - address = {Chicago}, - year = 1977} - -@BOOK{Woodward1987, - editor = {David Woodward}, - title = {Art and Cartography: Six Historical Essays}, - publisher = {University of Chicago Press}, - address = {Chicago}, - year = 1987} - -@BOOK{Woodward1996, - author = {David Woodward}, - title = {Catalogue of Watermarks in {I}talian Printed Maps, ca.~1540--1600}, - publisher = {University of Chicago Press}, - address = {Chicago}, - year = 1996} - - -@ARTICLE{ADA03, - author = {{American Diabetes Association}}, - title = {Diabetes Update}, - journal = {Nursing}, - year = 2003, - month = nov, - volume = {Suppl}, - pages = {19--20, 24}} - -@BOOK{AG98, - editor = {S. V. Ambudkar and M. M. Gottesman}, - title = {{ABC} Transporters: Biomedical, Cellular, and Molecular Aspects}, - publisher = {Academic Press}, - address = {San Diego (CA)}, - year = 1998, - volume = 292, - series = {Methods in enzymology}} - -@PRESENTATION{Ant03, - author = {Antani, S. and Long, L. R. and Thoma, G. R. and Lee, D. J.}, - title = {Anatomical Shape Representation in Spine X-ray Images. {P}aper presented at: {VIIP 2003}. {P}roceedings of the 3rd {IASTED} {I}nternational {C}onference on {V}isualization, {I}maging and {I}mage {P}rocessing}, - month = {2003 Sep~8--10}, - address = {Benalmadena, Spain}} - -@INPROCEEDINGS{Are05, - author = {Arendt, T.}, - title = {Alzheimer's Disease as a Disorder of Dynamic Brain Self-Organization}, - editor = {van Pelt, J. and Kamermans, M. and Levelt, C. N. and van Ooyen, A. and Ramakers, G. J. and Roelfsema, P. R.}, - booktitle = {Development, dynamics, and pathology of neuronal networks: from molecules to functional circuits. Proceedings of the 23rd International Summer School of Brain Research}, - month = {2003 Aug~25--29}, - organization = {Royal Netherlands Academy of Arts and Sciences}, - address = {Amsterdam, the Netherlands}, - publisher = {Amsterdam (Netherlands): Elsevier}, - year = 2005, - pages = {355--378}} - -@BOOK{Ber01, - editor = {Bergstresser, P. R. and Takashima, A.}, - title = {Gamma-delta T cells}, - address = {New York (NY)}, - publisher = {Karger}, - year = 2001, - series = {Chemical immunology}, - volume = 79} - -@ARTICLE{BGC04, - author = {Berrino, F. and Gatta, G. and Crosignani, P.}, - year = 2004, - title = {[{C}ase-control Evaluation of Screening Efficacy]}, - journal = {Epidemiol. Prev.}, - volume = 28, - pages = {354--359}, - note = {Italian}} - -@ARTICLE{Bla89, - author = {Black, H. R.}, - title = {Evaluation of the Elderly Hypertensive}, - journal = {Geriatrics}, - year = 1989, - volume = {44 Suppl B}, - pages = {15--19}} - -@BOOK{Bra04, - editor = {Bradley, W. G. and Daroff, R. B. and Fenichel, G. M. and Jankovic, J.}, - title = {Neurology in Clinical Practice}, - publisher = {Butterworth-Heinemann}, - year = 2004, - volume = {1, Principles of diagnosis and management}, - address = {Philadelphia (PA)}, - edition = {Fourth}} - -@MANUAL{CEN05, - author = {{European Committee for Electrotechnical Standardization (CENELEC)}}, - title = {Measurement and Assessment of Personal Exposures to Incoherent Optical Radiation -- Part 2: Visible and Infrared Radiation Emitted by Artificial Sources in the Workplace}, - address = {Brussels}, - organization = {CENELEC}, - year = 2005, - note = {Standard No. EN 14255-2:2005}} - -@PRESENTATION{Cha06, - author = {Chasman, J. and Kaplan, R. F.}, - title = {The effects of occupation on preserved cognitive functioning in dementia. Poster session presented at: Excellence in clinical practice. 4th Annual Conference of the American Academy of Clinical Neuropsychology}, - month = {2006 Jun~15--17}, - address = {Philadelphia, PA}} - -@INPROCEEDINGS{deT98, - author = {de The, G.}, - title = {Les priorit{\'e}s de sant{\'e} dans les pays en d{\'e}veloppement}, - booktitle = {Colloque Energie Solaire et Sant{\'e} dans les Pays en D{\'e}veloppement = Conference on Solar Energy and Health Care in Developing Countries}, - month = {1991 Nov~4--7}, - address = {Paris}, - publisher = {London: Tec \& Doc}, - year = {c1998}, - pages = {19--29}, - note = {French}} - -@PROCEEDINGS{DCK03, - editor = {Dostorovsky, J. O. and Carr, D. B. and Koltzenburg, M.}, - title = {Proceedings of the 10th World Congress on Pain}, - month = {2002 Aug~17--22}, - address = {San Diego, CA}, - publisher = {Seattle (WA): IASP Press}, - year = 2003} - -@ARTICLE{ElP05, - title = {La ``gripe del pollo'' vuela can las aves silvestres [{T}he ``bird flu'' flies with the wild birds]}, - journal = {El Pais (Madrid) (Ed. Europa)}, - year = 2005, - month = jul # "~17", - pages = {28 (col.~1)}, - note = {Spanish}} - -@BOOK{Eva04, - editor = {Evans, L. K. and Lang, N. M.}, - title = {Academic Nursing Practice}, - address = {New York (NY)}, - publisher = {Springer}, - year = {c2004}, - series = {Springer series on the teaching of nursing}} - -@BOOK{Fla04, - author = {{Flaws B, translator}}, - title = {The Classic of Difficulties: A Translation of the {N}an {J}ing}, - edition = {Third}, - address = {Boulder (CO)}, - publisher = {Blue Poppy Press}, - year = 2004} - -@ARTICLE{FM97, - title = {Neue {N}ifedipin-{Z}ubereitung erm{\"o}glicht t{\"a}gliche {E}inmalgabe [{N}ew nifedipine preparation makes single daily dose possible]}, - journal = {Fortschr. Med.}, - year = 1997, - month = nov # "~30", - volume = 115, - number = 33, - pages = {[following p. 54]}, - note = {German}} - -@BOOK{FBW04, - title = {Models and Perspectives in Health Psychology}, - publisher = {American Psychological Association}, - year = 2004, - editor = {Frank, R. G and Baum, A. and Wallander, J. L.}, - volume = 3, - series = {Boll TJ, editor. Handbook of clinical health psychology}, - address = {Washington (DC)}} - -@ARTICLE{Gau05, - author = {Gaul, G.}, - title = {When Geography Influences Treatment Options}, - journal = {Washington Post (Maryland Ed.)}, - year = 2005, - month = jul # "~24", - note = {Sect.~A:12 (col.~1)}} - -@ARTICLE{HN05, - title = {Pelvic Floor Exercise Can Reduce Stress Incontinence}, - journal = {Health News}, - year = 2005, - volume = 11, - number = 4, - pages = {11}} - -@INPROCEEDINGS{Hor98, - author = {Horrobin, D. F. and Lampinskas, P.}, - title = {The commercial development of food plants used as medicines}, - editor = {Prendergast, H. D. and Etkin, N. L. and Harris, D. R. and Houghton, P. J.}, - booktitle = {Plants for food and medicine. Proceedings of the Joint Conference of the Society for Economic Botany and the International Society for Ethnopharmacology}, - month = {1996 Jul~1--6}, - address = {London}, - publisher = {London: Royal Botanic Gardens, Kew}, - year = 1998, - pages = {75--81}} - -@BOOK{Ind01, - author = {Indryan, A. and Sarmukaddam, S. B.}, - title = {Medical Biostatistics}, - address = {New York (NY)}, - publisher = {Marcel Dekker}, - year = 2001, - series = {Biostatistics}, - number = 7} - -@BOOK{Jen05, - author = {Jenkins, P. F.}, - title = {Making Sense of the Chest X-ray: A Hands-on Guide}, - address = {New York (NY)}, - publisher = {Oxford University Press}, - year = 2005} - -@ARTICLE{KKZ06, - author = {Klose, R. J. and Kallin, E. M. and Zhang, Y.}, - title = {{JmjC}-domain-containing proteins and histone demethylation}, - journal = {Nat. Rev. Genet.}, - year = 2006, - volume = 7, - pages = {715--727}} - -@INPROCEEDINGS{Leo04, - author = {Leonard, K. J. and Winkelman, W.}, - title = {Developing Electronic Patient Records: Employing Interactive Methods to Ensure Patient Involvement}, - editor = {Ferreira de Oliveira, M. J.}, - booktitle = {Accessibility and quality of health services. Proceedings of the 28th Meeting of the European Working Group on Operational Research Applied to Health Services (ORAHS)}, - month = {2002 Jul~28--Aug~2}, - address = {Rio de Janeiro, Brazil}, - publisher = {Frankfurt (Germany): Peter Lang}, - year = {c2004}, - pages = {241--255}} - -@BOOK{Luz85, - author = {Luzikov, V. N.}, - title = {Mitochondrial Biogenesis and Breakdown. {Galkin~AV, translator; Roodyn~DB, editor}}, - address = {New York (NY)}, - publisher = {Consultants Bureau}, - year = 1985} - -@ARTICLE{Lyd08, - author = {Lyderson, K}, - title = {Risk of Disease Rises with Water Temperatures}, - journal = {Washington Post [Internet]}, - year = {{2008 Oct~20 [cited 2008 Dec~19]}}, - pages = {A08}, - url = {http://www.washingtonpost.com/wp-dyn/content/article/2008/10/19/AR2008101901533.html}, - note = {Article includes a correction}} - -@ARTICLE{Mac04, - author = {MacGregor, R. J.}, - title = {A Functional View of Consciousness and its Relations in Brain}, - journal = {J. Integr. Neurosci.}, - year = 2004, - volume = 3, - number = 3, - pages = {253--266}} - -@ARTICLE{Men05, - author = {Meneton, P. and Jeunemaitre, X. and de Wardener, H. E. and MacGregor, G. A.}, - title = {Links Between Dietary Salt Intake, Renal Salt Handling, Blood Pressure, and Cardiovascular Diseases}, - journal = {Physiol. Rev.}, - year = 2005, - month = apr, - volume = 85, - pages = {679--715}} - -@ARTICLE{NBK07, - author = {Nallamothu, B. K. and Bradley, E. H. and Krumholz, H. M.}, - title = {Time to treatment in primary percutaneous coronary intervention}, - journal = {N. Engl. J. Med.}, - year = 2007, - volume = 357, - number = {}, - pages = {1631--1638}, - month = oct # "~18"} - -@TECHREPORT{HBPEP, - author = {{National High Blood Pressure Education Program (US)}}, - title = {The Fourth Report on the Diagnosis of High Blood Pressure in Children. {R}ev. ed.}, - address = {Bethesda (MD)}, - institution = {National Heart, Lung, and Blood Institute (US)}, - year = 2005, - note = {(NIH publication; no.~05-5267)}} - -@ARTICLE{NYT05, - author = {}, - title = {Taking Steps Back to Normal after Novel Rabies Therapy}, - journal = {New York Times (National Ed.)}, - year = 2005, - month = dec # "~25", - volume = 155, - number = 53439, - pages = {23 (col.~3)}, - note = {Milwaukee, Dec~24}} - -@ARTICLE{NYT06, - author = {}, - title = {Major Decline in {U.S.} Deaths is Recorded}, - journal = {New York Times (Washington Final)}, - year = 2006, - month = apr # "~20", - note = {Sect.~A:14 (col.~6)}} - -@BOOK{Och00, - author = {Ochoa, S.}, - title = {Base molecular de la expresion del mensaje genetico [{M}olecular Basis of Gene Expression]}, - address = {Madrid}, - publisher = {Consejo Superior de Investigaciones Cientificas}, - year = 2000, - note = {Spanish}} - -@PRESENTATION{Pat03, - author = {Patrias, K.}, - title = {Computer-compatible writing and editing. Paper presented at: Interacting with the digital environment: modern scientific publishing. 46th Annual Meeting of the Council of Science Editors}, - month = {2003 May~3--6}, - address = {Pittsburgh, PA}} - -@ARTICLE{PTP03, - author = {Prokai-Tatrai, K. and Prokai, L.}, - title = {Modifying Peptide Properties by Prodrug Design for Enhanced Transport into the {CNS}}, - journal = {Prog. Drug Res.}, - year = 2003, - volume = 61, - pages = {155--188}} - -@INPROCEEDINGS{Ric03, - author = {Rice, A. S. and Farquhar-Smith, W. P. and Bridges, D. and Brooks, J. W.}, - title = {Canabinoids and Pain}, - editor = {Dostorovsky, J. O. and Carr, D. B. and Koltzenburg, M.}, - booktitle = {Proceedings of the 10th World Congress on Pain}, - month = {2002 Aug~17--22}, - address = {San Diego, CA}, - publisher = {Seattle (WA): IASP Press}, - year = 2003, - pages = {437--468}} - -@INBOOK{Rif06, - author = {Riffenburgh, R. H.}, - title = {Statistics in Medicine}, - edition = {Second}, - address = {Amsterdam (Netherlands)}, - publisher = {Elsevier Academic Press}, - year = 2006, - chapter = {24, Regression and correlation methods}, - pages = {447--486}} - -@MASTERSTHESIS{Rog05, - author = {Roguskie, J. M.}, - title = {The role of \emph{Pseudomonas aeruginosa} 1244 pilin glycan in virulence}, - address = {Pittsburgh (PA)}, - school = {Duquesne University}, - year = 2005} - -@PROCEEDINGS{SSM03, - editor = {Satoh, K. and Suzuki, S. and Matsunaga, M.}, - title = {Advances in brain research: cerebrovascular disorders and neurodegeneration. Proceedings of the 6th Hirosaki International Forum of Medical Science}, - month = {2002 Oct~15--16}, - address = {Hirosaki, Japan}, - publisher = {Amsterdam (Netherlands): Elsevier}, - year = 2003, - series = {Excerpta Medica international congress series}, - number = 1251} - -@INCOLLECTION{Sum03, - author = {Sumner, P. and Mollon, J. D.}, - title = {Did Primate Trichromacy Evolve for Frugivory or Folivory?}, - editor = {Mollon, J. D. and Pokorny, J. and Knoblauch, K.}, - booktitle = {Normal and Defective Colour Vision}, - address = {New York (NY)}, - publisher = {Oxford University Press}, - year = 2003, - pages = {21--30}} - -@PROCEEDINGS{vP05, - editor = {van Pelt, J. and Kamermans, M. and Levelt, C. N. and van Ooyen, A. and Ramakers, G. J. A. and Roelfsema, P. R.}, - title = {Development, dynamics, and pathology of neuronal networks: from molecules to functional circuits. Proceedings of the 23rd International Summer School of Brain Research}, - month = {2003 Aug~25--29}, - organization = {Royal Netherlands Academy of Arts and Sciences}, - address = {Amsterdam, the Netherlands}, - publisher = {Amsterdam: Elsevier}, - year = 2005, - series = {Progress in brain research}, - volume = 147} - -@ARTICLE{Ved06, - author = {Vedantam, S.}, - title = {When Staying Cool Seems Better Than Being Bad}, - journal = {Washington Post (Final Ed.)}, - year = 2006, - month = aug # "~7", - note = {Sect.~A:2 (col.~3 ). Part of a weekly series of stories about the sociology and psychology behind news events}} - -@ARTICLE{VMD07, - author = {Veronesi, U. and Maisonneuve, P. and Decensi, A.}, - title = {Tamoxifen: an enduring star}, - journal = {J. Natl Cancer Inst.}, - year = 2007, - volume = 99, - number = 4, - pages = {258--260}, - month = feb # "~21"} - -@BOOK{Wen95, - author = {Wenger, N. K. and Sivarajan Froelicher, E. and Smith, L. K. and Ades, P. A. and Berra, K. and Blumenthal, J. A. and Certo, C. M. E. and Dattilo, A. M. and Davis, D. and DeBusk, R. F. and others}, - title = {Cardiac Rehabilitation}, - publisher = {Agency for Health Care Policy and Research (US)}, - address = {Rockville (MD)}, - year = 1995} - -@ARTICLE{Wil04, - author = {Wilkniss, S. M. and Hunter, R. H. and Silverstein, S. M.}, - title = {Traitement multimodal de l'agressivit{\'e} et de la violence chez des personnes souffrant de psychose [{M}ultimodal Treatment of Aggression and Violence in Individuals with Psychosis]}, - journal = {Sante Ment Que}, - year = {2004 Autumn}, - volume = 29, - number = 2, - pages = {143--174}, - note = {French}} - -@PHDTHESIS{Zha05, - author = {Zhao, C.}, - title = {Development of Nanoelectrospray and Application to Protein Research and Drug Discovery}, - address = {Buffalo (NY)}, - school = {State University of New York at Buffalo}, - year = 2005} - -@BOOK{Sch02, - author = {Schott, J. and Priest, J.}, - title = {Leading antenatal classes: a practical guide}, - edition = {2nd ed}, - address = {Boston (MA)}, - publisher = {Books for Midwives}, - year = 2002} - -@INCOLLECTION{Sha78, - author = {Shakelford, R. T.}, - title = {Esophagoscopy}, - booktitle = {Surgery of the alimentary tract}, - publisher = {W.B. Saunders}, - address = {Philadelphia (PA)}, - year = 1978, - pages = "29--40", - chapter = 2} - -@ARTICLE{Smi75, - author = {Smith, C. E.}, - title = {The significance of mosquito longevity and blood-feeding behaviour in the dynamics of arbovirus infections}, - journal = {Med Biol}, - year = {1975}, - volume = 53, - pages = {288--294}} - -@ARTICLE{SRW05, - author = {Savage, E. and Ramsay, M. and White, J. et al}, - title = {Mumps outbreaks across {E}ngland and {W}ales in 2004: {O}bservational study}, - journal = {BMJ}, - year = 2005, - volume = 330, - number = 7500, - pages = {1119--1120}, - note = {[cited 2005 May 31]; Available from: http://bmj.bmjjournals.com/cgi/reprint/330/7500/1119}} - -@MISC{ACSPD, - title = {ACS Publications Division Home Page}, - url = {http://pubs.acs.org}, - lastchecked = {Nov~7, 2004}} - -@MANUAL{USDA00, - author = {{U.S. Department of Agriculture}}, - title = {Agriculture Fact Book 2000}, - organization = {U.S. Government Printing Office}, - address = {Washington, DC}, - year = {2000}} - -@INCOLLECTION{Alm96, - author = {Almlof, J. and Gropen, O.}, - title = {Relativistic Effects in Chemistry}, - booktitle = {Reviews in Computational Chemistry}, - editor = {Lipkowitz, K. B. and Boyd, D. B.}, - publisher = {VCH}, - address = {New York}, - year = {1996}, - volume = {8}, - pages = {206--210}} - -@BOOK{ACS06, - author = {{American Chemical Society, Committee on Analytical Reagents}}, - title = {Reagent Chemicals: Specifications and Procedures}, - edition = {10}, - address = {Washington, DC}, - year = {2006}} - -@BOOK{Ban75, - editor = {Bandy, A. R.}, - title = {The Chemistry of the Atmosphere: Oxidants and Oxidation in the Earth's Atmosphere}, - publisher = {Royal Society of Chemistry}, - address = {Cambridge, UK}, - year = {1995}} - -@MASTERSTHESIS{Bla04, - author = {Bl{\"a}ttler, T. M.}, - title = {Covalent Immobilization of Poly(\textsc{l}-lysine)-\textit{g}-poly(ethylene glycol) onto Aldehyde Plasma Polymer Coated Surfaces}, - type = {Diploma Thesis}, - school = {University of South Australia}, - year = {2004}} - -@ARTICLE{Bro45, - author = {Brosset, C.}, - title = {}, - journal = {Ark. Kemi, Mineral. Geol.}, - year = {1945}, - volume = {20A}, - pages = {No.~7}} - -@ARTICLE{Car01, - author = {Caruso, R. A. and Susha, A. and Caruso, F.}, - title = {Multilayered Titania, Silica and Laponite Nanoparticle Coatings on Polystyrene Colloidal Templates}, - journal = {Chem. Mater.}, - year = {2001}, - volume = {13}, - pages = {400--409}} - -@PHDTHESIS{Cha94, - author = {J. S. Chandrakanth}, - title = {Effects of Ozone on the Colloidal Stability of Particles Coated with Natural Organic Matter}, - type = {Ph.D. Dissertation}, - school = {University of Colorado}, - address = {Boulder, CO}, - year = {1994}} - -@UNPUBLISHED{Cha04, - author = {K. Chatterjee and A. Visconti and C. J. Mirocha}, - title = {Deepoxy T-2 Tetraol: A Metabolite of T-2 Toxin Found in Cow Urine}, - note = {\emph{J. Agric. Food Chem.}, submitted for publication, 2004}} - -@ARTICLE{Cha91, - author = {Y. Chauvin and B. Gilbert and I. Guibard}, - journal = {Vib. Spectrosc.}, - year = {1991}, - volume = {1}, - pages = {299--304}} - -@ARTICLE{Cha90, - author = {Y. Chauvin and B. Gilbert and I. Guibard}, - journal = {J. Chem. Soc., Chem. Commun.}, - year = {1990}, - pages = {1715--1716}} - -@PRESENTATION{Diz04, - author = {B. Dizman and M. O. Elasri and L. J. Mathias}, - title = {Presented at the 227th National Meeting of the American Chemical Society}, - address = {Anaheim, CA}, - month = {March~28--April~1}, - year = {2004}, - note = {Paper POLY 229}} - -@PHDTHESIS{Eri04, - author = {T. A. Erickson}, - title = {Development and Application of Geostatistical Methods to Modeling Spatial Variation in Snowpack Properties, Front Range, Colorado}, - type = {Ph.D. Dissertation}, - school = {University of Colorado}, - address = {Boulder, CO}, - year = {2004}} - -@INPROCEEDINGS{Gar88, - author = {Garrone, E. and Ugliengo, P.}, - title = {}, - booktitle = {Structure and Reactivity of Surfaces, \emph{Proceedings of the European Conference}}, - address = {Trieste, Italy}, - month = sep # "~13--20, 1988", - editor = {Zecchina, A. and Cost, G. and Morterra, C.}, - publisher = {Elsevier: Amsterdam}, - year = {1988}} - -@BOOK{Gou02, - author = {Gould, S. J.}, - title = {The Structure of Evolutionary Theory}, - publisher = {Belknap Press}, - address = {Cambridge, MA}, - year = {2002}} - -@INCOLLECTION{Hil90, - author = {Hillman, L. W.}, - title = {}, - booktitle = {Dye Laser Principles with Applications}, - editor = {Duarte, F. J. and Hillman, L. W.}, - publisher = {Academic}, - address = {New York}, - year = {1990}, - chapter = {2}} - -@INCOLLECTION{Hol05, - author = {Holbrey, J. D. and Chen, J. and Turner, M. B. and Swatloski, R. P. and Spear, S. K. and Rogers, R. D.}, - title = {Applying Ionic Liquids for Controlled Processing of Polymer Materials}, - booktitle = {Ionic Liquids in Polymer Systems: Solvents, Additives, and Novel Applications}, - editor = {Brazel, C. S. and Rogers, R. D.}, - series = {ACS Symposium Series}, - number = {913}, - publisher = {American Chemical Society}, - address = {Washington, DC}, - year = {2005}, - pages = {71--88}} - -@BOOK{Kli04, - author = {Kline, R. B.}, - title = {Principles and Practice of Structural Equation Modeling}, - edition = {Second}, - publisher = {Guilford Press}, - address = {New York}, - year = {2004}} - -@ARTICLE{Kli05, - author = {Klingler, J.}, - title = {Influence of Pretreatment on Sodium Powder}, - journal = {Chem. Mater.}, - year = {2005}, - volume = {17}, - pages = {2755--2768}} - -@INBOOK{LeC03, - author = {Le Couteur, P. and Burreson, J.}, - year = {2003}, - title = {Napoleon's Buttons: How 17 Molecules Changed History}, - edition = {}, - address = {New York}, - publisher = {Jeremy P. Tarcher/Putnam}, - pages = {32--47}} - -@MISC{Len04, - author = {Lenssen, K. C. and Jantscheff, P. and Kiedrowski, G. and Massing, U.}, - title = {Cationic Lipids with Serine Backbone for Transfecting Biological Molecules}, - note = {Eur. Pat. Appl. 1457483, 2004}} - -@BOOK{Leo05, - editor = {S. R. Leone and A. E. McDermott and A. Paul}, - title = {Annual Review of Physical Chemistry}, - publisher = {Annual Reviews}, - address = {Palo Alto, CA}, - year = {2005}, - volume = {56}} - @ARTICLE{LP02, author = {Y. Lu and J. J. Pignatello}, title = {}, @@ -1392,463 +229,3 @@ @ARTICLE{LP04 volume = {38}, pages = {5853--5862}} -@PHDTHESIS{Mae04, - author = {M{\"a}ckel, H.}, - title = {Capturing the Spectra of Silicon Solar Cells}, - school = {The Australian National University}, - year = {December 2004}} - -@BOOK{McG02, - title = {McGraw-Hill Encyclopedia of Science and Technology}, - edition = 9, - publisher = {McGraw-Hill}, - address = {New York}, - year = {2002}, - note = {20 vols}} - -@PHDTHESIS{Moh04, - author = {M. Mohamed}, - title = {Waterjet Cutting Up to 900~MPa}, - school = {University of Hannover}, - address = {Germany}, - year = {2004}} - -@INBOOK{Mor03, - author = {Morris, R.}, - year = {2003}, - title = {The Last Sorcerers: The Path from Alchemy to the Periodic Table}, - edition = {}, - address = {Washington, DC}, - publisher = {Joseph Henry Press}, - pages = {145--158}} - -@ARTICLE{Mul05, - author = {Mullin, R.}, - title = {}, - journal = {Chem. Eng. News}, - year = {2005}, - volume = {83}, - number = {Oct~17}, - pages = {7}} - -@MISC{Pet99, - author = {Petrovick, P. R. and Carlini, E.}, - title = {Antiulcerogenic Preparation from \textit{Maytenus ilicifolia} and Obtaintion Process}, - note = {Br. Patent PI 994502, March~6, 1999}} - -@INCOLLECTION{Pul04, - author = {Puls, J. and Saake, B.}, - title = {Industrially Isolated Hemicelluloses}, - booktitle = {Hemicelluloses: Science and Technology}, - editor = {Gatenholm, P. and Tenkanen, M.}, - series = {ACS Symposium Series}, - number = {864}, - publisher = {American Chemical Society}, - address = {Washington, DC}, - year = {2004}, - pages = {24--37}} - -@ARTICLE{Pus05, - author = {Puskas, J. E. and Chan, S. W. P. and McAuley, K. B. and Shaikh, S. and Kaszas, G.}, - title = {}, - journal = {J. Polym. Sci., Part A: Polym. Chem.}, - year = {2005}, - volume = {43}, - pages = {5394--5413 and references therein}} - -@BOOK{Sah04, - editor = {Saha, B. C. and Hayashi, K.}, - title = {Lignocellulose Biodegradation}, - series = {ACS Symposium Series}, - number = {889}, - publisher = {American Chemical Society}, - address = {Washington, DC}, - year = {2004}} - -@MISC{She04, - author = {Sheem, S. K.}, - title = {Low-Cost Fiber Optic Pressure Sensor}, - note = {US Patent 6,738,537, May~18, 2004}} - -@ARTICLE{Squ05, - author = {Squires, S.}, - title = {Falling Short on Nutrients}, - journal = {The Washington Post}, - volume = {}, - month = oct # "~4", - year = {2005}, - pages = {H1}} - -@BOOK{Stoc01, - editor = {J. H. Stocker}, - title = {Chemistry and Science Fiction}, - publisher = {American Chemical Society}, - year = {1998}, - address = {Washington, DC}} - -@ARTICLE{Tay05, - author = {Taylor, C. W. and Kumar, S.}, - title = {}, - journal = {Eur. J. Cancer}, - year = {2005}, - volume = {40}, - number = {Suppl.~1}, - pages = {781}} - -@TECHREPORT{Tsc04, - author = {Tschantz, B. A. and Moran, B. M.}, - title = {Modeling of the Hydrologic Transport of Mercury in the {UEFPC} Watershed}, - institution = {Lockheed Martin Energy Systems}, - address = {Bethesda, MD}, - month = {September}, - year = {2004}} - -@INCOLLECTION{Wib74, - author = {Wiberg, K.}, - title = {}, - booktitle = {Investigations of Rates and Mechanisms of Reactions}, - editor = {E. S. Lewis}, - series = {Techniques of Chemistry}, - volume = {VI, Part~I}, - publisher = {Wiley}, - address = {New York}, - year = {1974}, - pages = {764}} - -@BOOK{WHO02, - author = {{World Health Organization}}, - title = {Pathology and Genetics of Tumours of the Head and Neck}, - address = {Albany, NY}, - year = {2002}, - volume = {9}} - -@PRESENTATION{Zie03, - author = {K. D. Zientek and J. R. Eyler}, - title = {Presented at the 51st ASMS Conference on Mass Spectrometry and Allied Topics}, - address = {Montreal, Canada}, - month = jun # "~8--12, 2003"} - -@PHDTHESIS{Agu95, - author = {Agutter, A. J.}, - title = "The Linguistic Significance of Current {B}ritish Slang", - school = {Edinburgh University}, - type = {Unpublished doctoral dissertation}, - address = {UK}, - month = {}, - year = 1995, - note = {},} - -@BOOK{Ali95, - author = {S. Alinhac}, - year = 1995, - title = {Blowup for Nonlinear Hyperbolic Equations}, - volume = 17, - series = {Progress in Nonlinear Differential Equations and Applications}, - publisher = {Birkh{\"a}user}, - address = {Boston, MA}} - -@BOOK{Bow76, - editor = {F. E. Bowder}, - title = {Nonlinear Operators and Nonlinear Equations of Evolution in {B}anach Spaces}, - series = {Proceedings of Symposia in Pure Mathematics}, - volume = {18, Part~2}, - publisher = {American Mathematical Society}, - address = {Providence, RI}, - year = 1976} - -@ARTICLE{BGP02, - author = {J. Burckhardt and M. Gunzburger and J. Peterson}, - title = {Insensitive Functionals, Inconsistent Gradients, Spurious Minima, and Regularized Functionals in Flow Optimization Problems}, - journal = {Int. J. Comput. Fluid Dyn.}, - year = 2002, - volume = 16, - pages = {171--185}} - -@INCOLLECTION{Con96, - author = {Conn, A. R. and Toint, P. L.}, - title = {An Algorithm Using Quadratic Interpolation}, - booktitle = {Nonlinear Optimization and Applications}, - editor = {Di Pillo, G. and Giannessi, F.}, - publisher = {Kluwer Academic/Plenum Publishers}, - address = {New York}, - year = 1996, - pages = {27–-47}} - -@ARTICLE{Coo03, - author = {Coope, I. D. and Price, C. J.}, - title = {Positive Bases in Numerical Optimization}, - journal = {Comput. Optim. Appl.}, - volume = 21, - year = 2003, - pages = {169–-175}} - -@PHDTHESIS{Ell98, - author = {J. S. Ellenberg}, - title = {Hilbert modular forms and the {G}alois representations associated to {H}ilbert-{B}lumenthal abelian varieties}, - school = {Harvard University}, - year = 1998} - -@BOOK{Fle80, - author = {R. Fletcher}, - title = {Practical Methods of Optimization}, - edition = {Second}, - volume = 2, - publisher = {Wiley and Sons}, - address = {New York}, - year = 1980} - -@BOOK{FGK03, - author = {R. Fourer and D. M. Gay and B. W. Kernighan}, - title = {{AMPL}: A Modeling Language for Mathematical Programming}, - edition = {Second}, - publisher = {Thomson/Brooks/Cole}, - address = {Pacific Grove, CA}, - year = 2003} - -@INTRANSLATEDBOOK{fzf88, - author = {F. French}, - translator = {P. Smith}, - title = {English title of a chapter in the translation of a book in a foreign language}, - booktitle = {Title of a Book in Another Language (Quoted in that Language)}, - englishtitle = {English Title}, - volume = {}, - series = {}, - publisher = {Dover}, - address = {New York}, - edition = {}, - month = {}, - year = 1988, - note = {(original work published 1923)},} - -@BOOK{GMW81, - author = {Gill, P. E. and Murray, W. and Wright, M. H.}, - title = {Practical Optimization}, - publisher = {Academic Press}, - address = {London}, - year = 1981} - -@INCOLLECTION{Glo00, - author = {Glover, Fred}, - title = {Multi-start and strategic oscillation methods -- principles to exploit adaptive memory}, - editor = {Laguna, Manuel and Gonz{\'a}les-Velarde, Jos{\'e} Luis}, - booktitle = {Computing Tools for Modeling, Optimization and Simulation: Interfaces in Computer Science and Operations Research}, - pages = "1--24", - publisher = {Kluwer Academic}, - address = {Boston, MA}, - edition = {Second}, - year = 2000, - note = {},} - -@MISC{GHGsoft, - author = {T. G. Golda and P. D. Hough and G. Gay}, - title = "{APPSPACK} ({A}synchronous Parallel Pattern Search Package)", - note = "Software available at http://software.sandia.gov/appspack",} - -@UNPUBLISHED{Hag03, - author = {J. Haglund}, - title = {Conjectured Statistics for the {$q,t$}-{C}atalan Numbers}, - journal = "to appear in Adv. Math.", - year = "preprint (2003)", - url = "http://www.math.upenn.edu/$\sim$jhaglund",} - -@ARTICLE{Hai01, - author = {M. Haiman}, - title = {Hilbert Schemes, Polygraphs, and the {M}acdonald Positivity Conjecture}, - journal = {J. Amer. Math. Soc.}, - volume = 14, - year = 2001, - pages = {941-–1006}, - url = {http://www.math.berkeley.edu/$\sim$mhaiman}, - note = {{MR~2002c:14008}}} - -@INCOLLECTION{Har97, - author = {Hart, W. E.}, - title = {A Stationary Point Convergence Theory of Evolutionary Algorithms}, - booktitle = {Foundations of Genetic Algorithms 4}, - editor = {Belew, R. K. and Vose, M. D.}, - publisher = {Morgan Kaufmann}, - address = {San Francisco}, - year = 1997, - pages = {127–-134}} - -@ARTICLE{Hol03, - author = {J. Holt}, - title = {Multiple Bumping of Components of Deformation Spaces of Hyperbolic 3-Manifolds}, - journal = {Amer. J. Math.}, - volume = 125, - year = 2003, - pages = {691-–736}, - url = {http://muse.jhu.edu/journals/american\_journal\_of\_mathematics/v125/125.4holt.pdf}} - -@BOOK{Hor96, - editor = {U. Hornung}, - title = {Homogenization and Porous Media}, - publisher = {Springer}, - address = {Berlin}, - year = 1996} - -@INPROCEEDINGS{Ker96, - author = "Hudson Kern", - title = "The resurgent {J}apanese economy and a {J}apan--{U}nited {S}tates free trade agreement", - booktitle = "4th International Conference on the Restructuring of the Economic and Political System in {J}apan and {E}urope", - pages = {147--156}, - month = {21--25 May 1996}, - year = 1997, - address = "Milan, Italy", - organization = "", - publisher = "World Scientific, Singapore", - note = {},} - -@ARTICLE{Kih01, - author = {S. Kihara}, - title = {On an Elliptic Curve over {$Q(t)$} of Rank $\geq$14}, - journal = {Proc. Japan Acad. Ser. A Math. Sci.}, - volume = 77, - year = 2001, - pages = {50-–51}, - note = {{MR~2002a:11057}}} - -@ARTICLE{Neu83, - author = "Martin Neumann", - title = "Parallel {GRASP} with Path-Relinking for Job Shop Scheduling", - journal = {Mol. Phys.}, - year = 1983, - volume = 50, - number = 4, - pages = "841--843", - month = apr, - note = {}, } - -@BOOK{Pat88, - author = {F. W. Patel}, - editor = {}, - title = {Title of a Book}, - volume = {II}, - series = {Monographs on Technical Aspects}, - publisher = {Dover}, - address = {New York}, - edition = {}, - month = {}, - year = 1988, - note = {},} - -@TECHREPORT{Pow00, - author = {Powell, M. J. D.}, - title = {On the {L}agrange Functions of Quadratic Models that are Defined by Interpolation}, - number = {DAMTP 2000/NA10}, - institution = {Department of Applied Mathematics and Theoretical Physics, University of Cambridge}, - address = {Cambridge, UK}, - year = 2000} - -@BOOK{Ste98, - title = {Matrix Algorithms. Volume 1: Basic Decompositions}, - publisher = {SIAM}, - year = 1998, - author = {G. W. Stewart}, - address = {Philadelphia}} - -@ARTICLE{Str97, - author = {N. P. Strickland}, - title = {Finite Subgroups of Formal Groups}, - journal = {J. Pure Appl. Algebra}, - volume = 121, - year = 1997, - pages = {161--208}} - -@BOOK{Wei95, - author = {A. Weil}, - title = {Basic Number Theory}, - publisher = {Springer-Verlag}, - address = {Berlin}, - year = 1995} - -@PHDTHESIS{Agu95, - author = {Agutter, A. J.}, - title = "The Linguistic Significance of Current {B}ritish Slang", - school = {Edinburgh University}, - type = {Unpublished doctoral dissertation}, - address = {UK}, - month = {}, - year = 1995, - note = {},} - -@INTRANSLATEDBOOK{fzf88, - author = {F. French}, - translator = {P. Smith}, - title = {English title of a chapter in the translation of a book in a foreign language}, - booktitle = {Title of a Book in Another Language (Quoted in that Language)}, - englishtitle = {English Title}, - volume = {}, - series = {}, - publisher = {Dover}, - address = {New York}, - edition = {}, - month = {}, - year = 1988, - note = {(original work published 1923)},} - -@INCOLLECTION{Glo00, - author = {Glover, Fred}, - title = {Multi-start and strategic oscillation methods -- principles to exploit adaptive memory}, - editor = {Laguna, Manuel and Gonz{\'a}les-Velarde, Jos{\'e} Luis}, - booktitle = {Computing Tools for Modeling, Optimization and Simulation: Interfaces in Computer Science and Operations Research}, - pages = "1--24", - publisher = {Kluwer Academic}, - address = {Boston, MA}, - edition = {Second}, - year = 2000, - note = {},} - -@PRESENTATION{Hov03, - author = {Hovland, P.}, - title = {Automatic Differentiation and its Role in Simulation-Based Optimization}, - organization = {IMA Workshop}, - address = {Minneapolis, MN}, - year = 2003} - -@INPROCEEDINGS{Ker96, - author = "Hudson Kern", - title = "The resurgent {J}apanese economy and a {J}apan--{U}nited {S}tates free trade agreement", - booktitle = "4th International Conference on the Restructuring of the Economic and Political System in {J}apan and {E}urope", - pages = {147--156}, - month = {21--25 May 1996}, - year = "1997", - address = "Milan, Italy", - organization = "", - publisher = "World Scientific, Singapore", - note = {},} - -@MISC{Mul00, - key = {MultiSimplex 2.0}, - title = {Multi{S}implex 2.0}, - note = {Grabitech Solutions AB, Sundvall, Sweden, 2000; software available at http://www.multisimplex.com}} - -@ARTICLE{Neu83, - author = "Martin Neumann", - title = "Parallel {GRASP} with Path-Relinking for Job Shop Scheduling", - journal = {Mol. Phys.}, - year = 1983, - volume = 50, - number = 4, - pages = "841--843", - month = apr, - note = {}, } - -@BOOK{Pat88, - author = {F. W. Patel}, - editor = {}, - title = {Title of a Book}, - volume = {II}, - series = {Monographs on Technical Aspects}, - publisher = {Dover}, - address = {New York}, - edition = {}, - month = {}, - year = 1988, - note = {},} - -@UNPUBLISHED{Tay03, - author = {R. Taylor}, - title = {On the meromorphic continuation of degree two {L-functions}}, - year = {preprint (2003)}, - url = {http://abel.math.harvard.edu/$\sim$rtaylor/}} diff --git a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd index 148b3f452..5af5775f6 100644 --- a/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd +++ b/inst/rmarkdown/templates/tf/skeleton/skeleton.Rmd @@ -407,41 +407,41 @@ output: ### American Psychological Association reference style (APA) -References should be cited in accordance with \citeauthor{APA10} (APA) style, i.e. in alphabetical order separated by semicolons, e.g. ‘\citep{Ban77,Pia88,VL07}’ or ‘\ldots see Smith (1985, p. 75)’. If there are two or more authors with the same surname, use the first author's initials with the surnames, e.g. ‘\citep{Lig08,Lig06}’. If there are three to five authors, list all the authors in the first citation, e.g. ‘\citep{GSSM91}’. In subsequent citations, use only the first author's surname followed by et al., e.g. ‘\citep{GSSM91}’. For six or more authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, \ldots) with the year to order the entries in the reference list and use these lower-case letters with the year in the in-text citations, e.g. ‘(Green, 1981a,b)’. For further details on this reference style, see the Instructions for Authors on the Taylor & Francis website. +References should be cited in accordance with \citeauthor{APA10} (APA) style, i.e. in alphabetical order separated by semicolons, e.g. ‘\citep{Ban77,Pia88,VL07}’ or ‘\ldots see Smith (1985, p. 75)’. If there are two or more authors with the same surname, use the first author's initials with the surnames, e.g. ‘\citep{Lig08,Lig06}’. If there are three to five authors, list all the authors in the first citation, e.g. ‘\citep{GSSM91}’. In subsequent citations, use only the first author's surname followed by et al., e.g. ‘\citep{GSSM91}’. For six or more authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, \ldots) with the year to order the entries in the reference list and use these lower-case letters with the year in the in-text citations, e.g. ‘\citep{FogEHPD04,FogJEE04}’. For further details on this reference style, see the Instructions for Authors on the Taylor & Francis website. Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Nas93` in the citation form `\citep{Nas93}` produces ‘\citep{Nas93}’, and the keys `Koc59`, `Han04` and `Cla08` in the citation form `\citep{Koc59,Han04,Cla08}` produce ‘\citep{Koc59,Han04,Cla08}’. The citation `\citep{Cha08}` produces ‘\citep{Cha08}’ where the citation first appears in the text, and ‘\citep{Cha08}’ in any subsequent citation. The appropriate citation style for different situations can be obtained, for example, by `\citet{Ovi95}` for ‘\citet{Ovi95}’, `\citealp{MPW08}` for ‘\citealp{MPW08}’, and `\citealt{Sch93}` for ‘\citealt{Sch93}’. Citation of the year alone may be produced by `\citeyear{Sch00}`, i.e. ‘\citeyear{Sch00}’, or `\citeyearpar{Gra05}`, i.e. ‘\citeyearpar{Gra05}’, or of the author(s) alone by `\citeauthor{Rit74}`, i.e. ‘\citeauthor{Rit74}’. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\citep[p.~31]{Hay08}` produces ‘\citep[p. 31]{Hay08}’; `\citep[see][pp.~73-77]{PI51}` produces ‘\citep[see][pp. 73--77]{PI51}’; `\citep[e.g.][]{Fel81}` produces ‘\citep[e.g.][]{Fel81}’. A ‘plain’ `\cite` command will produce the same results as a `\citet`, i.e. `\cite{BriIP}` will produce ‘\cite{BriIP}’. ### Chicago Author-Date reference style (CAD) -References should be cited in Chicago author-date style, e.g. ‘\citep{Alb05,Gre08,Sch87}’ or ‘\ldots see Smith (1985, 75)’. If there are three authors, list them all in every citation, e.g. ‘\citep{Nowacki20}’. For more than three authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, ...) with the year to order the entries in the References list and use these letters with the year in the in-text citations, e.g. ‘\citep{FogEHPD04,FogJEE04}’. If two or more authors have the same surname, use their initials with the surnames, e.g. ‘(C. Doershuk 2010; J. Doershuk 2009)’. If the first author's names and the years of publication are identical for several references, include enough co-author names to eliminate ambiguity, e.g. `(Schonen, Baker, et al. 2009; Schonen, Brooks, et al. 2009)'. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. +References should be cited in Chicago author-date style, e.g. ‘\citep{Ban77,Pia88,VL07}’ or ‘\ldots see Smith (1985, 75)’. If there are three authors, list them all in every citation, e.g. ‘\citep{GSSM91}’. For more than three authors, cite the first author's name followed by et al. For two or more sources by the same author(s) in the same year, use lower-case letters (a, b, c, ...) with the year to order the entries in the References list and use these letters with the year in the in-text citations, e.g. ‘\citep{FogEHPD04,FogJEE04}’. If two or more authors have the same surname, use their initials with the surnames, e.g. ‘\citep{Lig08,Lig06}’. If the first author's names and the years of publication are identical for several references, include enough co-author names to eliminate ambiguity, e.g. `(Schonen, Baker, et al. 2009; Schonen, Brooks, et al. 2009)'. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. -Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Fow89` in the citation form `\citep{Fow89}` produces ‘\citep{Fow89}’, and the keys `{Bro86,Bro02,Roh08}` in the citation form `\citep{Bro86,Bro02,Prinzie09}` produce ‘\citep{Bro86,Bro02,Prinzie09}’. The appropriate citation style for different situations can be obtained, for example, by `\citet{Draper1987}` for ‘\citet{Draper1987}’, `\citealt{Lev05}` for ‘\citealt{Lev05}’, or `\citealp{Mor08}` for ‘\citealp{Mor08}’. Citation of the year alone may be produced by `\citeyear{Cho08}`, i.e. ‘\citeyear{Cho08}’, or `\citeyearpar{ChoGul08}`, i.e. ‘\citeyearpar{ChoGul08}’, or of the author(s) alone by `\citeauthor{Wittgenstein2009}`, i.e. ‘\citeauthor{Wittgenstein2009}’. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\citep[see][275]{Ell1968}` produces ‘\citep[see][275]{Ell1968}’; `\citep[e.g.][]{Wau50}` produces ‘\citep[e.g.][]{Wau50}’; `\citet[chap.~2]{Str00}` produces ‘\citet[chap. 2]{Str00}’. A ‘plain’ `\cite` command will produce the same result as a `\citet`, i.e. `\cite{Wei02}` will produce ‘\cite{Wei02}’. +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Nas93` in the citation form `\citep{Nas93}` produces ‘\citep{Nas93}’, and the keys `{Koc59,Han04,Cla08}` in the citation form `\citep{Koc59,Han04,Cla08}` produce ‘\citep{Koc59,Han04,Cla08}’. The appropriate citation style for different situations can be obtained, for example, by `\citet{Ovi95}` for ‘\citet{Ovi95}’, `\citealt{Sch93}` for ‘\citealt{Sch93}’, or `\citealp{MPW08}` for ‘\citealp{MPW08}’. Citation of the year alone may be produced by `\citeyear{Sch00}`, i.e. ‘\citeyear{Sch00}’, or `\citeyearpar{Gra05}`, i.e. ‘\citeyearpar{Gra05}’, or of the author(s) alone by `\citeauthor{Rit74}`, i.e. ‘\citeauthor{Rit74}’. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\citep[see][275]{PI51}` produces ‘\citep[see][275]{PI51}’; `\citep[e.g.][]{Fel81}` produces ‘\citep[e.g.][]{Fel81}’; `\citet[chap.~2]{Str00}` produces ‘\citet[chap. 2]{Str00}’. A ‘plain’ `\cite` command will produce the same result as a `\citet`, i.e. `\cite{BriIP}` will produce ‘\cite{BriIP}’. ### National Library of Medicine reference style (NLM) References should be cited in accordance with US National Library of Medicine (NLM) style. References are cited in the text by a number in square brackets (e.g. [1], [2,4,10], [11--15], _not_ [11]--[15]), in the order in which they first appear. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. -Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Jen05` in the citation form `\cite{Jen05}` produces ‘\cite{Jen05}’, and the keys `{Sch02,Wen95}` in the citation form `\cite{Sch02,Wen95}` produce ‘\cite{Sch02,Wen95}’. The citation for a range of bibliographic entries (e.g.\ ‘\cite{Sha78,AG98,Smi75,Men05,DCK03,Hor98,Ant03,Zha05,Rog05,SRW05}’) will automatically be produced by `\cite{Sha78,AG98,Smi75,Men05,DCK03,Hor98,Ant03,Zha05,Rog05,SRW05}`. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g.\ `\cite[cf.][]{Gau05}` produces ‘\cite[cf.][]{Gau05}’, `\cite[p.356]{BGC04}` produces ‘\cite[p.356]{BGC04}’, and `\cite[see][p.73--77]{PI51}` produces ‘\cite[see][p.73--77]{PI51}’. +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Ban77` in the citation form `\cite{Ban77}` produces ‘\cite{Ban77}’, and the keys `{Pia88,VL07}` in the citation form `\cite{Pia88,VL07}` produce ‘\cite{Pia88,VL07}’. The citation for a range of bibliographic entries (e.g.\ ‘\cite{Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,PI51}’) will automatically be produced by `\cite{Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,PI51}`. Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g.\ `\cite[cf.][]{Fel81}` produces ‘\cite[cf.][]{Fel81}’, `\cite[p.356]{Str00}` produces ‘\cite[p.356]{Str00}’, and `\cite[see][p.73--77]{BriIP}` produces ‘\cite[see][p.73--77]{BriIP}’. ### Reference Style-P (TFP) References cited in the text should be quoted by italic numbers in parentheses (e.g.\ (_1_), (_2_, _4_, _10_), (_11_--_15_), _not_ (_11_)--(_15_)), in the order in which they first appear. For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. -Each bibliographic entry has a key, which is assigned by the author and used to refer to that entry in the text. In this document, the key `Gou02` in the citation form `\cite{Gou02}` produces ‘\cite{Gou02}’, and the keys `LeC03` and `Ban75` in the citation form `\cite{LeC03,Ban75}` produce ‘\cite{LeC03,Ban75}’. The citation for a range of bibliographic entries such as ‘\cite{Sah04,Hil90,Pul04,Kli04,Leo05,Wib74,McG02,Gar88,Zie03,Cha94,Moh04,ACSPD,Car01,Pus05,Mul05,Tay05,Squ05,Len04,Pet99,She04,Tsc04,Cha04}’ will automatically be produced by `\cite{Sah04,Hil90,Pul04,Kli04,Leo05,Wib74,McG02,Gar88,Zie03,Cha94,Moh04,` `ACSPD,Car01,Pus05,Mul05,Tay05,Squ05,Len04,Pet99,She04,Tsc04,Cha04}`. By using the `merge` option to `natbib`, citation keys within a multiple `\cite` command may contain a leading `*` that causes them to be merged in the bibliography together with the previous citation as a single entry with a single reference number. For example, `\cite{LP02,*LP04}` produces ‘\cite{LP02,*LP04}’, and both references are listed in the bibliography under one entry with that number. +Each bibliographic entry has a key, which is assigned by the author and used to refer to that entry in the text. In this document, the key `Ban77` in the citation form `\cite{Ban77}` produces ‘\cite{Ban77}’, and the keys `Pia88` and `VL07` in the citation form `\cite{Pia88,VL07}` produce ‘\cite{Pia88,VL07}’. The citation for a range of bibliographic entries such as ‘\cite{Nas93,Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,Hay08,PI51,Fel81,BriIP}’ will automatically be produced by `\cite{Nas93,Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,Hay08,PI51,Fel81,BriIP}`. By using the `merge` option to `natbib`, citation keys within a multiple `\cite` command may contain a leading `*` that causes them to be merged in the bibliography together with the previous citation as a single entry with a single reference number. For example, `\cite{LP02,*LP04}` produces ‘\cite{LP02,*LP04}’, and both references are listed in the bibliography under one entry with that number. ### Reference Style-Q (TFQ) References should be cited in the text by a number in square brackets (e.g. [1], [2,4,10], [11--15], not [11]--[15]) in the order in which they first appear. For further details on this reference style, see the Instructions for Authors on the Taylor & Francis website. -Each bibliographical entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Ali95` in the citation form `\cite{Ali95}` produces ‘\cite{Ali95}’, and the keys `Wei95` and `GMW81` in the citation form `\cite{Wei95,GMW81}` produce ‘\cite{Wei95,GMW81}’. The citation for a range of bibliographic entries (e.g. ‘\cite{Bow76,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,BGP02,Kih01,Hol03,Hai01,Hag03}’) will automatically be produced by `\cite{Bow76,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,BGP02,` `Kih01,Hol03,Hai01,Hag03}`. Optional notes may be included at the end of a citation by the use of square brackets, e.g. `\cite[cf.][]{GHGsoft}` produces ‘\cite[cf.][]{GHGsoft}’, and `\cite[see][and references therein]{Pow00}` produces ‘\cite[see][and references therein]{Pow00}’. +Each bibliographical entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Ban77` in the citation form `\cite{Ban77}` produces ‘\cite{Ban77}’, and the keys `Pia88` and `VL07` in the citation form `\cite{Pia88,VL07}` produce ‘\cite{Pia88,VL07}’. The citation for a range of bibliographic entries (e.g. ‘\cite{Nas93,Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,Hay08,PI51,Fel81,BriIP}’) will automatically be produced by `\cite{Nas93,Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,Hay08,PI51,Fel81,BriIP}`. Optional notes may be included at the end of a citation by the use of square brackets, e.g. `\cite[cf.][]{Lig08}` produces ‘\cite[cf.][]{Lig08}’, and `\cite[see][and references therein]{GSSM91}` produces ‘\cite[see][and references therein]{GSSM91}’. ### Reference Style-S (TFS) References should be cited in the text by numbers in square brackets based on the order in which they appear in an alphabetical list of references at the end of the document (not the order of citation), so the first reference cited in the text might be [23]. For example, these may take the forms [32], [5,,6,,14], [21--55] (\emph{not} [21]--[55]). For further details on this reference style, see the Instructions for Authors on the Taylor \& Francis website. -Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Ali95` in the citation form `\cite{Ali95}` produces ‘\cite{Ali95}’, and the keys `Bow76` and `BGP02` in the citation form `\cite{Bow76,BGP02}` produce ‘\cite{Bow76,BGP02}’. The citation for a range of bibliographic entries (e.g. ‘\cite{GMW81,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,Kih01,Hol03,Hai01,Hag03,Hov03,Mul00,GHGsoft,Pow00}’) will automatically be produced by `\cite{GMW81,Hor96,Con96,Har97,FGK03,Fle80,Ste98,Ell98,Str97,Coo03,Kih01,` `Hol03,Hai01,Hag03,Hov03,Mul00,GHGsoft,Pow00}`. -Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\cite[cf.][]{Tay03}` produces ‘\cite[cf.][]{Tay03}’, and `\cite[see][and references therein]{Wei95}` produces ‘\cite[see][and references therein]{Wei95}’. +Each bibliographic entry has a key, which is assigned by the author and is used to refer to that entry in the text. In this document, the key `Ban77` in the citation form `\cite{Ban77}` produces ‘\cite{Ban77}’, and the keys `Pia88` and `VL07` in the citation form `\cite{Pia88,VL07}` produce ‘\cite{Pia88,VL07}’. The citation for a range of bibliographic entries (e.g. ‘\cite{Nas93,Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,Hay08,PI51,Fel81,BriIP}’) will automatically be produced by `\cite{Nas93,Koc59,Han04,Cla08,Cha08,Ovi95,Sch93,MPW08,Sch00,Gra05,Rit74,Hay08,PI51,Fel81,BriIP}`. +Optional notes may be included at the beginning and/or end of a citation by the use of square brackets, e.g. `\cite[cf.][]{Lig08}` produces ‘\cite[cf.][]{Lig08}’, and `\cite[see][and references therein]{GSSM91}` produces ‘\cite[see][and references therein]{GSSM91}’. ## The list of references From 02da0fd8a87cc514dcf52dbb3c995aeff5b01531 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 08:17:04 +0100 Subject: [PATCH 25/29] Drop leading empty line --- inst/rmarkdown/templates/tf/skeleton/interactsample.bib | 1 - 1 file changed, 1 deletion(-) diff --git a/inst/rmarkdown/templates/tf/skeleton/interactsample.bib b/inst/rmarkdown/templates/tf/skeleton/interactsample.bib index 997b857eb..d00a29db4 100644 --- a/inst/rmarkdown/templates/tf/skeleton/interactsample.bib +++ b/inst/rmarkdown/templates/tf/skeleton/interactsample.bib @@ -228,4 +228,3 @@ @ARTICLE{LP04 year = {2004}, volume = {38}, pages = {5853--5862}} - From e0b8e90bab8799ad5303aa48bc8ea783f347da2f Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Rafael=20Laboissi=C3=A8re?= Date: Sat, 14 Dec 2024 20:34:03 +0100 Subject: [PATCH 26/29] Use Unicode escaping in my family name --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index dd2428566..7c6aba7d7 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -80,7 +80,7 @@ Authors@R: c( comment = c(ORCID = "0000-0001-8558-6183", github = "dmi3kno")), person("Tom", "Palmer", , "remlapmot@hotmail.com", role = "ctb", comment = c(ORCID = "0000-0003-4655-4511", github = "remlapmot")), - person("Rafael", "Laboissière", , "rafael@laboissiere.net", role = "ctb", + person("Rafael", "Laboissi\u00e8re", , "rafael@laboissiere.net", role = "ctb", comment = c(ORCID = "0000-0002-2180-9250", github = "rlaboiss")) ) Description: A suite of custom R Markdown formats and templates for From d867df98c33061170ed8fb2a3627c727cf67e48b Mon Sep 17 00:00:00 2001 From: Christophe Dervieux Date: Mon, 16 Dec 2024 10:20:51 +0100 Subject: [PATCH 27/29] test all new TF article reference style --- tests/testit/test-formats.R | 7 ++++++- 1 file changed, 6 insertions(+), 1 deletion(-) diff --git a/tests/testit/test-formats.R b/tests/testit/test-formats.R index 9ac05cd5b..5ac83f795 100644 --- a/tests/testit/test-formats.R +++ b/tests/testit/test-formats.R @@ -79,7 +79,12 @@ test_format("rss") test_format("sage") test_format("sim") test_format("springer", skip = !rmarkdown::pandoc_available("2.11.4")) -test_format("tf") +test_format("tf", output_options = list(reference_style = "CAD")) +test_format("tf", output_options = list(reference_style = "APA")) +test_format("tf", output_options = list(reference_style = "NLM")) +test_format("tf", output_options = list(reference_style = "TFP")) +test_format("tf", output_options = list(reference_style = "TFQ")) +test_format("tf", output_options = list(reference_style = "TFS")) test_format("trb") # Deactivate because of https://github.com/rstudio/rticles/issues/523 # test_format("wellcomeor") From 6c5ef4aae172b3793e1dcac456abdd0dbe2928eb Mon Sep 17 00:00:00 2001 From: Christophe Dervieux Date: Mon, 16 Dec 2024 11:49:30 +0100 Subject: [PATCH 28/29] Trying back using accented character in DESCRIPTION --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index 657fc62e5..a363f018f 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -80,7 +80,7 @@ Authors@R: c( comment = c(ORCID = "0000-0001-8558-6183", github = "dmi3kno")), person("Tom", "Palmer", , "remlapmot@hotmail.com", role = "ctb", comment = c(ORCID = "0000-0003-4655-4511", github = "remlapmot")), - person("Rafael", "Laboissi\u00e8re", , "rafael@laboissiere.net", role = "ctb", + person("Rafael", "Laboissière", , "rafael@laboissiere.net", role = "ctb", comment = c(ORCID = "0000-0002-2180-9250", github = "rlaboiss")) ) Description: A suite of custom R Markdown formats and templates for From 17170b05c19acf36ecbfc9af4e150d5eccfe8727 Mon Sep 17 00:00:00 2001 From: Christophe Dervieux Date: Mon, 16 Dec 2024 11:53:04 +0100 Subject: [PATCH 29/29] Bump version --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index a363f018f..322555903 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: rticles Title: Article Formats for R Markdown -Version: 0.27.8 +Version: 0.27.10 Authors@R: c( person("JJ", "Allaire", , "jj@posit.co", role = "aut"), person("Yihui", "Xie", , "xie@yihui.name", role = "aut",