Kapitel 85 Referenzen in R benutzen

In diesem Kapitel lernen Sie folgendes:

  • Referenzen von R aus in PubMed suchen und importieren
  • Zitieren in RMarkdown oder Quarto

85.0.1 Pakete, die wir hier benutzen:

library(dplyr)
library(RefManageR)
library(bib2df)
library(rbibutils)
library(XML)
library(DT)
library(RISmed)
library(bibliometrix)

Es gibt viele Pakete, die helfen, in PubMed zu suchen.

Wir benutzen hier das Paket RefManager

Wir schauen uns hier drei Beispiele an:

  • Erstellen einer Publikationsliste der in PubMed gelisteten Artikel (Achtung: nicht alle Artikel sind in PubMed indexiert)
  • Erstellen einer Publikationsliste aus Scholar.Google
  • Erstellen einer Liste der aktuellen Resultate für eine Suchstrategie in PubMed

85.1 Beispiel Publikationsliste

Stellen wir uns vor, wir möchten eine Publikationsliste mit R erstellen.

Wir können in Anführungs- und Schlusszeichen die Suchstrategie eingeben - im Prinzip gleich wie in PubMed selber. Die Option retmax gibt an, wie viele Artikel ich maximal finden möchte.

  • Achtung: Wenn ich die Option retmax nicht setze, werden nur 20 Artikel gefunden (da die Default-Einstellung retmax=20 ist).

Eigentlich gibt es noch eine fiel =“author” Option, doch wenn ich diese setze, finde ich seit kurzem nichts mehr.

publist1 <- RefManageR::ReadPubMed(query="hilfiker r",  mindate = 2004, datetype = "pdat", database = "PubMed", retmax=1000)
length(publist1)
## [1] 94
publist1[1:2]
## [1] H. P. Duong, A. Garcia, R. Hilfiker, et al. "Systematic Review of
## Biopsychosocial Prognostic Factors for Return to Work After Acute
## Orthopedic Trauma: A 2020 Update". Eng. In: _Frontiers in
## rehabilitation sciences_ 2 (Feb. 2021), p. 791351. ISSN: 2673-6861.
## DOI: 10.3389/fresc.2021.791351. PMID: 36188871.
## 
## [2] O. P. D. Santos, P. Melly, R. Hilfiker, et al. "Effectiveness of
## Educational Interventions to Increase Skills in Evidence-Based Practice
## among Nurses: The EDITcare Systematic Review". Eng. In: _Healthcare
## (Basel, Switzerland)_ 10.11 (Nov. 2022). ISSN: 2227-9032. DOI:
## 10.3390/healthcare10112204. PMID: 36360544.

Wir können auch die ersten zwei Studien und die letzte Studie in der Publist1 anzeigen:

publist1[[c(1:2,length(publist1))]]
## [1] H. P. Duong, A. Garcia, R. Hilfiker, et al. "Systematic Review of
## Biopsychosocial Prognostic Factors for Return to Work After Acute
## Orthopedic Trauma: A 2020 Update". Eng. In: _Frontiers in
## rehabilitation sciences_ 2 (Feb. 2021), p. 791351. ISSN: 2673-6861.
## DOI: 10.3389/fresc.2021.791351. PMID: 36188871.
## 
## [2] U. Isele, P. van Hoogevest, R. Hilfiker, et al. "Large-scale
## production of liposomes containing monomeric zinc phthalocyanine by
## controlled dilution of organic solvents". Eng. In: _Journal of
## pharmaceutical sciences_ 83.11 (Nov. 1994), pp. 1608-16. ISSN:
## 0022-3549. DOI: 10.1002/jps.2600831117. PMID: 7891283.
## 
## [3] O. P. D. Santos, P. Melly, R. Hilfiker, et al. "Effectiveness of
## Educational Interventions to Increase Skills in Evidence-Based Practice
## among Nurses: The EDITcare Systematic Review". Eng. In: _Healthcare
## (Basel, Switzerland)_ 10.11 (Nov. 2022). ISSN: 2227-9032. DOI:
## 10.3390/healthcare10112204. PMID: 36360544.

Oder die letzten zwei Referenzen.

publist1[(length(publist1)-1):length(publist1)]
## [1] U. Isele, P. van Hoogevest, R. Hilfiker, et al. "Large-scale
## production of liposomes containing monomeric zinc phthalocyanine by
## controlled dilution of organic solvents". Eng. In: _Journal of
## pharmaceutical sciences_ 83.11 (Nov. 1994), pp. 1608-16. ISSN:
## 0022-3549. DOI: 10.1002/jps.2600831117. PMID: 7891283.
## 
## [2] M. Madörin, P. van Hoogevest, R. Hilfiker, et al. "Analysis of
## drug/plasma protein interactions by means of asymmetrical flow
## field-flow fractionation". Eng. In: _Pharmaceutical research_ 14.12
## (Dec. 1997), pp. 1706-12. ISSN: 0724-8741. DOI:
## 10.1023/a:1012171511285. PMID: 9453057.

Wir können die Suche auch noch etwas spezifischer machen:

publist <- ReadPubMed("hilfiker r (paraplegic or BFH or HES-SO or Leukerbad or Sion or Bern or Valens)", mindate = 2004 ,datetype = "pdat", database = "PubMed", retmax=100)
length(publist)
## [1] 81

85.2 Beispiel der Referenzen

print(publist[author = "J. C. Hill"], .opts = list(bib.style = "authoryear"))
## Aebischer, B., J. C. Hill, R. Hilfiker, et al. (2015). "German
## Translation and Cross-Cultural Adaptation of the STarT Back Screening
## Tool". Eng. In: _PloS one_ 10.7, p. e0132068. ISSN: 1932-6203. DOI:
## 10.1371/journal.pone.0132068. PMID: 26161669.
## 
## Karstens, S., J. Zebisch, J. Wey, et al. (2022). "Validation of the
## German version of the STarT-MSK-Tool: A cohort study with patients from
## physiotherapy clinics". Eng. In: _PloS one_ 17.7, p. e0269694. ISSN:
## 1932-6203. DOI: 10.1371/journal.pone.0269694. PMID: 35776764.

oder

print(publist[title = "Back"], .opts = list(bib.style = "authoryear"))
## Aebischer, B., J. C. Hill, R. Hilfiker, et al. (2015). "German
## Translation and Cross-Cultural Adaptation of the STarT Back Screening
## Tool". Eng. In: _PloS one_ 10.7, p. e0132068. ISSN: 1932-6203. DOI:
## 10.1371/journal.pone.0132068. PMID: 26161669.
## 
## Cerini, T., R. Hilfiker, T. F. Riegler, et al. (2022). "12 weeks high
## intensity interval training versus moderate intensity continuous
## training in chronic low back pain subjects: a randomised single-blinded
## feasibility study". Eng. In: _Archives of physiotherapy_ 12.1, p. 12.
## ISSN: 2057-0082. DOI: 10.1186/s40945-022-00136-3. PMID: 35491417.
## 
## Cudré-Mauroux, N., N. Kocher, R. Bonfils, et al. (2006). "Relationship
## between impaired functional stability and back pain in children: an
## exploratory cross-sectional study". Eng. In: _Swiss medical weekly_
## 136.45-46, pp. 721-5. ISSN: 1424-7860. DOI: 10.4414/smw.2006.11531.
## PMID: 17183436.
## 
## Hilfiker, R., L. M. Bachmann, C. A. Heitz, et al. (2007). "Value of
## predictive instruments to determine persisting restriction of function
## in patients with subacute non-specific low back pain. Systematic
## review". Eng. In: _European spine journal : official publication of the
## European Spine Society, the European Spinal Deformity Society, and the
## European Section of the Cervical Spine Research Society_ 16.11, pp.
## 1755-75. ISSN: 0940-6719. DOI: 10.1007/s00586-007-0433-8. PMID:
## 17701230.
## 
## Hilfiker, R., I. A. Knutti, B. Raval-Roland, et al. (2016). "Validity
## and responsiveness of the French version of the Örebro Musculoskeletal
## Pain Screening Questionnaire in chronic low back pain". Eng. In:
## _European spine journal : official publication of the European Spine
## Society, the European Spinal Deformity Society, and the European
## Section of the Cervical Spine Research Society_ 25.9, pp. 2741-9. ISSN:
## 1432-0932. DOI: 10.1007/s00586-016-4635-9. PMID: 27272277.
## 
## —–— (2017). "Erratum to: Validity and responsiveness of the French
## version of the Örebro Musculoskeletal Pain Screening Questionnaire in
## chronic low back pain". Eng. In: _European spine journal : official
## publication of the European Spine Society, the European Spinal
## Deformity Society, and the European Section of the Cervical Spine
## Research Society_ 26.1, p. 297. ISSN: 1432-0932. DOI:
## 10.1007/s00586-016-4866-9. PMID: 27885475.
## 
## Hilfiker, R., S. Obrist, G. Christen, et al. (2009). "The use of the
## comprehensive International Classification of Functioning, Disability
## and Health Core Set for low back pain in clinical practice: a
## reliability study". Eng. In: _Physiotherapy research international :
## the journal for researchers and clinicians in physical therapy_ 14.3,
## pp. 147-66. ISSN: 1358-2267. DOI: 10.1002/pri.436. PMID: 19194959.
## 
## Mohammadi, V., A. Letafatkar, H. Sadeghi, et al. (2017). "The effect of
## motor control training on kinetics variables of patients with
## non-specific low back pain and movement control impairment: Prospective
## observational study". Eng. In: _Journal of bodywork and movement
## therapies_ 21.4, pp. 1009-1016. ISSN: 1532-9283. DOI:
## 10.1016/j.jbmt.2016.12.009. PMID: 29037616.
## 
## Oesch, P. R., R. Hilfiker, J. P. Kool, et al. (2010). "Perceived
## functional ability assessed with the spinal function sort: is it valid
## for European rehabilitation settings in patients with non-specific
## non-acute low back pain?" Eng. In: _European spine journal : official
## publication of the European Spine Society, the European Spinal
## Deformity Society, and the European Section of the Cervical Spine
## Research Society_ 19.9, pp. 1527-33. ISSN: 1432-0932. DOI:
## 10.1007/s00586-010-1429-3. PMID: 20490874.
## 
## Opsommer, E., R. Hilfiker, B. Raval-Roland, et al. (2013). "Test-retest
## reliability of the Örebro Musculoskeletal Pain Screening Questionnaire
## and the Situational Pain Scale in patients with chronic low back pain".
## Eng. In: _Swiss medical weekly_ 143, p. w13903. ISSN: 1424-3997. DOI:
## 10.4414/smw.2013.13903. PMID: 24317959.
## 
## Opsommer, E., G. Rivier, G. Crombez, et al. (2017). "The predictive
## value of subsets of the Örebro Musculoskeletal Pain Screening
## Questionnaire for return to work in chronic low back pain". Eng. In:
## _European journal of physical and rehabilitation medicine_ 53.3, pp.
## 359-365. ISSN: 1973-9095. DOI: 10.23736/S1973-9087.17.04398-2. PMID:
## 28382810.
## 
## Sattelmayer, M., T. Lorenz, C. Röder, et al. (2012). "Predictive value
## of the Acute Low Back Pain Screening Questionnaire and the Örebro
## Musculoskeletal Pain Screening Questionnaire for persisting problems".
## Eng. In: _European spine journal : official publication of the European
## Spine Society, the European Spinal Deformity Society, and the European
## Section of the Cervical Spine Research Society_ 21 Suppl 6.Suppl 6, pp.
## S773-84. ISSN: 1432-0932. DOI: 10.1007/s00586-011-1910-7. PMID:
## 21789527.

85.3 Speichern des BibEntry Objektes in eine Datei

Die erste Variante speichert das BibLateX Objekt in eine Datei. Diese Datei kann ich problemlos in Zotero importieren, ich habe es jedoch nicht geschafft, sie in Endnote zu importieren (mit Filter BibTex) - wahrscheinlich würde dies auch gehen.

WriteBib(publist, "Referenzen_PubMed_Hilfiker.bib")
## Writing 81 Bibtex entries ... OK
## Results written to file 'Referenzen_PubMed_Hilfiker.bib'

Wir können mit der Option biblatex = FALSE / TRUE wählen, ob es als bibtex oder biblatex gespeichert wird. biblatex= FALSE bedeutet, dass es als bibtex gespeichert wird (Details siehe Manual des Paketes RefManageR) oder hier.

WriteBib(publist,biblatex=FALSE, "Referenzen_PubMed_Hilfiker_bibtex.bib")
## Writing 81 Bibtex entries ... OK
## Results written to file 'Referenzen_PubMed_Hilfiker_bibtex.bib'

Damit wir die gespeicherte Datei in Endnote importieren können, benutzen wir das Paket ributils mit dem Befehl bibconvert. Diese Datei kann danach einfach in Endnote importiert werden (Filter EndNote Import).

rbibutils::bibConvert(infile = "Referenzen_PubMed_Hilfiker_bibtex.bib", outfile = "Referenzen_PubMed_Hilfiker_for_Endnote_for_PublicationLIst.end", informat = "bibtex", outformat = "end")
## $infile
## [1] "Referenzen_PubMed_Hilfiker_bibtex.bib"
## 
## $outfile
## [1] "Referenzen_PubMed_Hilfiker_for_Endnote_for_PublicationLIst.end"
## 
## $nref_in
## [1] 81
## 
## $nref_out
## [1] 81

Falls wir die Referenzen in einer Tabelle präsentieren möchten, können wir dies mit folgenden zwei Ansätzen erreichen:

df1 <- "Referenzen_PubMed_Hilfiker_bibtex.bib" %>%
  RefManageR::ReadBib() %>%
  as.data.frame()

DT::datatable(df1, filter='top', options=list(pageLength=3))
df2 <- bib2df::bib2df("Referenzen_PubMed_Hilfiker_bibtex.bib")
## Warning: `as_data_frame()` was deprecated in tibble 2.0.0.
## ℹ Please use `as_tibble()` instead.
## ℹ The signature and semantics have changed, see `?as_tibble`.
## ℹ The deprecated feature was likely used in the bib2df package.
##   Please report the issue to the authors.
DT::datatable(df2, filter='top', options=list(pageLength=3))

Die beiden Ergebnisse sind nicht ganz identisch. Siehe auch hier.

Da nicht alle Artikel in PubMed indexiert sind, könnten wir unsere Publikationsliste auch mit Scholar Google erstellen. Dazu benötigen Sie Ihre Scholar ID, die Sie in der URL ihres Scholar Profils finden. Hier finden Sie ein Video zur Erstellung eines Scholar Google Profils{target=“_blank”)}.

Wir können auch bestimmen, wie die Tabelle sortiert sein soll. Standardmässig ist die Tabelle nach der Anzahl Zitierungen sortiert.

85.4 Scholar Google

publist_scholar<-scholar::get_publications(id="GKQKdCQAAAAJ",cstart = 0,cstop = Inf,pagesize = 100,flush = FALSE,sortby = "citation")
DT::datatable(publist_scholar, options=list(pageLength=3), filter='top')

Wenn Sie nun anders sortieren möchten, können Sie dies in den Optionen tun. Im nächsten Beispiel sortieren wir absteigend nach Jahr und absteigend nach Zitierungen (innerhalb jedes Jahres). So haben Sie zuerst die neusten Artikel und diese sind pro Jahr nach Zitierungen sortiert:

publist_scholar<-scholar::get_publications(id="GKQKdCQAAAAJ",cstart = 0,cstop = Inf,pagesize = 100,flush = FALSE,sortby = "citation")
DT::datatable(publist_scholar, options=list(pageLength=3, order = list(list(6, 'des'), list(5, 'desc'))), filter='top')

85.5 Beispiel einer Suchstrategie in PubMed

Wir möchten nun zu einem Thema immer die aktuellsten Studien aus PubMed abrufen und in einer Tabelle zeigen.

Mit unserer Suche möchten wir alle Studien finden, die bei Patient:innen mit Arthrose eine Übungstherapie mit einer randomisierten Studie untersuchen. Die Suche wäre natürlich für eine systematische Literatursuche nicht sensitiv genug, aber für einen aktuellen Überblick zu haben, genügt sie. Wenn wir nun die Suchstrategie mit dem RefManageR Paket durchführen, bekommen wir eine Fehlermeldung, dass die Suchstrategie zu lang ist.

search_oa <- ReadPubMed("(randomised or randomized or randomly or random or RCT) (Osteoarthritis[tiab] or Osteoarthrosis[tiab]) (Exercise or resistance or conditioning or aerobic or exercising or training or 'physical activity' )", mindate=2021, database = "PubMed", retmax=1000)
## Error in read_xml.response(temp): Request-URI Too Long (HTTP 414).

Wegen dieser Fehlermeldung weichen wir auf ein anderes Paket aus. Wir probieren es mit dem RISmed Paket.

Die Suche ist mit dem RISmed Paket sehr einfach.

# Code adapted, original code from https://ispmbern.github.io/covid-19/living-review/collectingdata.html
# create the search string

search_topic <- "(randomised or randomized or randomly or random or RCT) (Osteoarthritis[tiab] or Osteoarthrosis[tiab]) (Exercise or resistance or conditioning or aerobic or exercising or training or 'physical activity' )"
# EUtilsSummary command retrieves information on search
search_query<-EUtilsSummary(search_topic, mindate=2021, maxdate=2021)
## Warning in any(is.na(WhichArgs)) || sapply(WhichArgs, length) > 1: 'length(x) =
## 2 > 1' in coercion to 'logical(1)'
summary(search_query)
## Query:
## (("random allocation"[MeSH Terms] OR ("random"[All Fields] AND "allocation"[All Fields]) OR "random allocation"[All Fields] OR "randomization"[All Fields] OR "randomized"[All Fields] OR "random"[All Fields] OR "randomisation"[All Fields] OR "randomisations"[All Fields] OR "randomise"[All Fields] OR "randomised"[All Fields] OR "randomising"[All Fields] OR "randomizations"[All Fields] OR "randomize"[All Fields] OR "randomizes"[All Fields] OR "randomizing"[All Fields] OR "randomness"[All Fields] OR "randoms"[All Fields] OR ("random allocation"[MeSH Terms] OR ("random"[All Fields] AND "allocation"[All Fields]) OR "random allocation"[All Fields] OR "randomization"[All Fields] OR "randomized"[All Fields] OR "random"[All Fields] OR "randomisation"[All Fields] OR "randomisations"[All Fields] OR "randomise"[All Fields] OR "randomised"[All Fields] OR "randomising"[All Fields] OR "randomizations"[All Fields] OR "randomize"[All Fields] OR "randomizes"[All Fields] OR "randomizing"[All Fields] OR "randomness"[All Fields] OR "randoms"[All Fields]) OR "randomly"[All Fields] OR ("random allocation"[MeSH Terms] OR ("random"[All Fields] AND "allocation"[All Fields]) OR "random allocation"[All Fields] OR "randomization"[All Fields] OR "randomized"[All Fields] OR "random"[All Fields] OR "randomisation"[All Fields] OR "randomisations"[All Fields] OR "randomise"[All Fields] OR "randomised"[All Fields] OR "randomising"[All Fields] OR "randomizations"[All Fields] OR "randomize"[All Fields] OR "randomizes"[All Fields] OR "randomizing"[All Fields] OR "randomness"[All Fields] OR "randoms"[All Fields]) OR "RCT"[All Fields]) AND ("Osteoarthritis"[Title/Abstract] OR "Osteoarthrosis"[Title/Abstract])) AND ("exercise"[MeSH Terms] OR "exercise"[All Fields] OR "exercises"[All Fields] OR "exercise therapy"[MeSH Terms] OR ("exercise"[All Fields] AND "therapy"[All Fields]) OR "exercise therapy"[All Fields] OR "exercise s"[All Fields] OR "exercised"[All Fields] OR "exerciser"[All Fields] OR "exercisers"[All Fields] OR "exercising"[All Fields] OR ("resist"[All Fields] OR "resistance"[All Fields] OR "resistances"[All Fields] OR "resistant"[All Fields] OR "resistants"[All Fields] OR "resisted"[All Fields] OR "resistence"[All Fields] OR "resistences"[All Fields] OR "resistent"[All Fields] OR "resistibility"[All Fields] OR "resisting"[All Fields] OR "resistive"[All Fields] OR "resistively"[All Fields] OR "resistivities"[All Fields] OR "resistivity"[All Fields] OR "resists"[All Fields]) OR ("conditioning, psychological"[MeSH Terms] OR ("conditioning"[All Fields] AND "psychological"[All Fields]) OR "psychological conditioning"[All Fields] OR "conditioned"[All Fields] OR "conditioning"[All Fields] OR "conditionings"[All Fields]) OR ("aerobic"[All Fields] OR "aerobically"[All Fields] OR "bacteria, aerobic"[MeSH Terms] OR ("bacteria"[All Fields] AND "aerobic"[All Fields]) OR "aerobic bacteria"[All Fields] OR "aerobe"[All Fields] OR "aerobes"[All Fields] OR "exercise"[MeSH Terms] OR "exercise"[All Fields] OR "aerobics"[All Fields]) OR ("exercise"[MeSH Terms] OR "exercise"[All Fields] OR "exercises"[All Fields] OR "exercise therapy"[MeSH Terms] OR ("exercise"[All Fields] AND "therapy"[All Fields]) OR "exercise therapy"[All Fields] OR "exercise s"[All Fields] OR "exercised"[All Fields] OR "exerciser"[All Fields] OR "exercisers"[All Fields] OR "exercising"[All Fields]) OR ("education"[MeSH Subheading] OR "education"[All Fields] OR "training"[All Fields] OR "education"[MeSH Terms] OR "train"[All Fields] OR "train s"[All Fields] OR "trained"[All Fields] OR "training s"[All Fields] OR "trainings"[All Fields] OR "trains"[All Fields]) OR ("exercise"[MeSH Terms] OR "exercise"[All Fields] OR ("physical"[All Fields] AND "activity"[All Fields]) OR "physical activity"[All Fields])) AND 2021/01/01:2021/12/31[Date - Entry] 
## 
## Result count:  314
records <- EUtilsGet(search_query, type = "efetch", db = "pubmed")
class(records)
## [1] "Medline"
## attr(,"package")
## [1] "RISmed"

Damit wir die Daten in einer Tabelle präsentieren können, müssen wir etwas basteln.

Wir benutzen Code, der von einer Forschungsgruppe des ISPM geschrieben wurdehttps://ispmbern.github.io/covid-19/living-review/collectingdata.html.

pubmed_data_list <- list('Title' = ArticleTitle(records), 
                         'Authors' = Author(records), 
                         'Year' = YearPubmed(records), 
                         'Journal' = Title(records),
                         'PublicationType' = PublicationType(records),
                         'Language' = Language(records))

pubmed_data <- data.frame('Title' = ArticleTitle(records),
                          'Year' = YearPubmed(records), 
                          'Journal' = Title(records),
                          'Language' = Language(records))
#concatenate authors: 
  authors<-vector()
  author1<-vector()
  
authors_list<-Author(records)
n_authors<-length(authors_list)

Es kann vorkommen, dass der folgende Code nicht läuft. Der Grund ist meistens ein störendes Zeichen in einem der Felder. Ich habe jedoch noch keine Lösung dafür gefunden.

for(i in 1:n_authors){
    tmp<-paste0(records@Author[[i]]$LastName,", ",records@Author[[i]]$Initials)
    tmp2<-paste(tmp, collapse="; ")
    authors<-append(authors,tmp2)
    author1<-append(author1,records@Author[[i]]$LastName[1])
  }
# we need to add additional fields
  pubmed_data <- data.frame('authors'=authors, 'title'=ArticleTitle(records),
                            'abstract'=AbstractText(records),'journal'=MedlineTA(records), 'pages'=MedlinePgn(records),
                            'volume'=Volume(records),'issue'=Issue(records),'year'=YearPubmed(records),
                            'pmid'=PMID(records), 'doi'=ELocationID(records), 
                            'url1'=paste0("https://www.ncbi.nlm.nih.gov/pubmed/",PMID(records)), 'author1'=author1) 

Wir geben die Tabelle ohne Abstracts aus:

pubmed_data_without_abstracts<-pubmed_data %>% 
  dplyr::select(-abstract)
DT::datatable(pubmed_data_without_abstracts, filter='top')

85.6 Zitieren in einem RMarkdown

Sie müssen im YAML des Rmarkdowns (oder des index.RMD bei einem bookdown Projekt) folgendes schreiben:

  • bibliography: references.bib (wobei references.bib ihre Bibtex-Datei mit den Referenzen ist)

Siehe auch hier https://bookdown.org/yihui/rmarkdown-cookbook/bibliography.html für mehr Erklärungen.

Im Text zitieren Sie mit dem Schlüssel der Referenz. Diesen finden Sie am einfachsten, wenn Sie die Bibtex-Datei mit einem guten Texteditor (z.B. Notepad++) öffnen (siehe nächstes Bild).

Print-Screen einer Bibtex-Datei. Markiert ist der Referenz-Schlüssel RN51. Im RMarkdown-Text fügen Sie die Referenz ein, indem sie ein @ plus den Schlüssel hinschreiben (also für den Artikel in der obigen Abbildung RN51).

So können wir in einem Satz die Referenz einfügen Aebischer et al. (2015).

Es wäre auch möglich, den Titel über den Referenzen zu ändern, d.h. anstatt References irgendeinen anderen Titel zu wählen. Wir könnten im YAML folgendes einfügen: reference-section-title: “Referenzen” . Bei mir führte dies jedoch zu einer Fehlermeldung.

Wenn im YAML kein reference-section-title steht, können Sie am Ende des RMarkdowns folgendes einfügen um den Titel in Referenzen zu ändern (oder jeder andere Titel den Sie wünschen).

Bibliographie am Ende einfügen mit Titel “Referenzen”.

Weiter Tipps finden Sie hier https://monashdatafluency.github.io/r-rep-res/citations.html.

85.7 Referenzen

Aebischer B et al. (2015) German Translation and Cross-Cultural Adaptation of the STarT Back Screening Tool. PLoS One 10, e0132068.
Gils MJ van et al. (2022) Antibody Responses Against SARS-CoV-2 Variants Induced by Four Different SARS-CoV-2 Vaccines in Health Care Workers in the Netherlands: A Prospective Cohort Study. PLoS medicine 19, e1003991.
Reverberi R (2008) The Statistical Analysis of Immunohaematological Data. Blood Transfusion 6, 37.
Rogan S et al. (2015) Validity Study of a Jump Mat Compared to the Reference Standard Force Plate. Asian J Sports Med 6, e25561.