1 Introducción

Este documento incluye el código para reproducir los ejemplos de consultas a OpenAlex utilizados en el artículo “OpenAlex: breve guía de consulta a través de R”, Infonomy, 2(1), e24011, https://doi.org/10.3145/infonomy.24.011.

El primer paso es abrir el paquete openalexR. También abrimos el paquet dplyr que nos permitirá mejorar la visualización de la información recuperada.

library(openalexR)
library(dplyr)

2 Consulta de un trabajo

En primer lugar, creamos un objeto en R, al que denominamos data.1, en el que guardamos la información resultante de consultar el DOI 10.3145/thinkepi.2018.06.

data.1 <- openalexR::oa_fetch(entity = "works",
                              doi = "10.3145/epi.2020.mar.03")

Veamos la información.

dplyr::glimpse(data.1)
## Rows: 1
## Columns: 36
## $ id                          <chr> "https://openalex.org/W3012538122"
## $ display_name                <chr> "Mapa de visibilidad y posicionamiento en ~
## $ author                      <list> [<data.frame[4 x 11]>]
## $ ab                          <chr> "The visibility and the search engine posi~
## $ publication_date            <chr> "2020-03-14"
## $ so                          <chr> "Profesional De La Informacion"
## $ so_id                       <chr> "https://openalex.org/S180455664"
## $ host_organization           <chr> "Ediciones Profesionales de la Informacio~
## $ issn_l                      <chr> "1386-6710"
## $ url                         <chr> "https://doi.org/10.3145/epi.2020.mar.03"
## $ pdf_url                     <chr> "https://revista.profesionaldelainformacio~
## $ license                     <lgl> NA
## $ version                     <chr> "publishedVersion"
## $ first_page                  <lgl> NA
## $ last_page                   <lgl> NA
## $ volume                      <chr> "29"
## $ issue                       <chr> "2"
## $ is_oa                       <lgl> TRUE
## $ is_oa_anywhere              <lgl> TRUE
## $ oa_status                   <chr> "bronze"
## $ oa_url                      <chr> "https://revista.profesionaldelainformacio~
## $ any_repository_has_fulltext <lgl> TRUE
## $ language                    <chr> "en"
## $ grants                      <lgl> NA
## $ cited_by_count              <int> 5
## $ counts_by_year              <list> [<data.frame[3 x 2]>]
## $ publication_year            <int> 2020
## $ cited_by_api_url            <chr> "https://api.openalex.org/works?filter=cit~
## $ ids                         <list> <"https://openalex.org/W3012538122", "http~
## $ doi                         <chr> "https://doi.org/10.3145/epi.2020.mar.03"
## $ type                        <chr> "article"
## $ referenced_works            <list> <"https://openalex.org/W1527311855", "http~
## $ related_works               <list> <"https://openalex.org/W1998240937", "http~
## $ is_paratext                 <lgl> FALSE
## $ is_retracted                <lgl> FALSE
## $ concepts                    <list> [<data.frame[11 x 5]>]

Para mejorar la visualización, podemos emplear el siguiente código.

data.1 %>% 
  show_works() %>%
  knitr::kable()
id display_name first_author last_author so url is_oa top_concepts
W3012538122 Mapa de visibilidad y posicionamiento en buscadores de los principales grupos mediáticos españoles Carlos Lopezosa Juan-María Corbella-Cordomi Profesional De La Informacion https://doi.org/10.3145/epi.2020.mar.03 TRUE Visibility, Search engine

En vez de un único DOI podemos consultar varios simultáneamente:

data.2 <- openalexR::oa_fetch(entity = "works",
                              doi = c("10.3145/infonomy.24.003",
                                      "10.3145/infonomy.2024.004",
                                      "10.3145/infonomy.2024.005"))

data.2 %>% 
  show_works() %>%
  knitr::kable()
id display_name first_author last_author so url is_oa top_concepts
W4390958462 Cómo fomentar la experiencia en el espectador dentro de los relatos periodísticos inmersivos María José Benítez de Gracia Susana Herrera Damas INFONOMY https://doi.org/10.3145/infonomy.24.003 FALSE Humanities
W4391040198 Periodismo que busca un tránsito de comunicar sólo “para” a comunicar “con”. Algunas propuestas prácticas Ana-Isabel Rodríguez-Vázquez Xosé López García INFONOMY https://doi.org/10.3145/infonomy.2024.004 TRUE Humanities
W4391055179 Información sobre salud. La función del periodista Sergio Ferrer-Pérez Carmen Peñafiel Sáiz INFONOMY https://doi.org/10.3145/infonomy.2024.005 TRUE Humanities

3 Consulta de una autora

El siguiente extracto de código cumple una función similar. En este caso, indicamos que la entidad que deseamos consultar es una autora.

data.3 <- oa_fetch(entity = "authors",
                   identifier ="orcid:0000-0002-9056-8251")

data.3 %>% 
  show_authors() %>%
  knitr::kable()
id display_name orcid works_count cited_by_count affiliation_display_name top_concepts
A5070018631 Carol Tenopir 0000-0002-9056-8251 680 6940 University of Tennessee at Knoxville World Wide Web, Library science, Law

4 Consulta de una revista

data.4 <- oa_fetch(entity = "venues",
                   identifier ="issn:2990-2290")

dplyr::glimpse(data.4)
## Rows: 1
## Columns: 15
## $ id                     <chr> "https://openalex.org/S4387290465"
## $ display_name           <chr> "INFONOMY"
## $ host_organization_name <chr> "Ediciones Profesionales de la Informacion SL"
## $ issn                   <list> "2990-2290"
## $ issn_l                 <list> "2990-2290"
## $ is_oa                  <lgl> FALSE
## $ is_in_doaj             <lgl> FALSE
## $ ids                    <list> <"https://openalex.org/S4387290465", "2990-2290~
## $ homepage_url           <lgl> NA
## $ works_count            <int> 0
## $ cited_by_count         <int> 0
## $ counts_by_year         <list> [<data.frame[1 x 3]>]
## $ x_concepts             <lgl> NA
## $ works_api_url          <chr> "https://api.openalex.org/works?filter=primary_~
## $ type                   <chr> "journal"

5 Búsqueda de trabajos por título, año de publicación y citas recibidas

En los siguientes ejemplos vamos a construir consultas para recuperar un listado de trabajos. El primer ejemplo nos permite recuperar los trabajos que incluyen en el título la expresión information literacy y que han sido publicados en los primeros diez de días de febrero de 2024. Visualizamos los títulos.

data.5 <- openalexR::oa_fetch(entity = "works",
                   title.search = "information literacy",
                   from_publication_date = "2024-02-01",
                   to_publication_date = "2024-02-10")

print(data.5$display_name)
##  [1] "Information literacy of higher vocational college students in digital age"                                                                                                                                                                                                                                                        
##  [2] "A Rubric-Based Assessment of Information Literacy in Graduate Course Term Papers"                                                                                                                                                                                                                                                 
##  [3] "Media and information literacy as a model of societal balance: A grounded meta-synthesis"                                                                                                                                                                                                                                         
##  [4] "Incorporating Information Literacy in MET Design Project: Year 2 Implementation"                                                                                                                                                                                                                                                  
##  [5] "Using a Knowledge Mapping Tool in Engineering Information Literacy Instruction: A First Experiment"                                                                                                                                                                                                                               
##  [6] "Assessing Information Literacy in Capstone Design Projects: Where are students still struggling?"                                                                                                                                                                                                                                 
##  [7] "Collaborative mind mapping in RICOSRE learning model to improve students’ information literacy"                                                                                                                                                                                                                                   
##  [8] "GIFTS: Building a sense of connection to campus and engineering identity through information literacy"                                                                                                                                                                                                                            
##  [9] "Using Decision-based Learning to Develop Expert Information Literacy Behaviors in Engineering Undergraduates"                                                                                                                                                                                                                     
## [10] "Paradoxes of media and information literacy; the crisis of information <b>Paradoxes of media and information literacy; the crisis of information</b> , by Jutta Haider and Olof Sundin, London, Routledge, 2022, 174 pp., $71.50 (soft cover), open access athttps://doi.org/10.4324/9781003163237, ISBN 978-1-003-16323-7(ebook)"
## [11] "Sources and Perceived Credibility of Child Nutrition Information in Relation to Maternal Health Literacy"                                                                                                                                                                                                                         
## [12] "Challenges of mastering information and communication technology literacy competence for teachers in the age of digital learning"                                                                                                                                                                                                 
## [13] "Work in Progress: Enhancing Undergraduate Biomedical Engineering Laboratory Reports through Information and Data Literacy Instruction"

El siguiente código recupera los trabajos que incluyen la expresión “information literacy” en el título y han sido citados más de 500 veces. Obviamente, sería posible combinar las consulta anterior y ésta en una única búsqueda.

data.6 <- openalexR::oa_fetch(entity = "works",
                              title.search = "information literacy",
                              cited_by_count = ">500")

data.6 %>% 
  show_works() %>%
  knitr::kable()
id display_name first_author last_author so url is_oa top_concepts
W2080018620 Information Literacy Competency Standards for Higher Education Patricia A Iannuzzi NA Community & Junior College Libraries https://doi.org/10.1300/j107v09n04_09 FALSE Promulgation, Accreditation, Information literacy
W2053011943 Information and digital literacies: a review of concepts David Bawden NA Journal of Documentation https://doi.org/10.1108/eum0000000007083 FALSE Information literacy, Literacy, Computer literacy
W2049638293 Media Literacy and the Challenge of New Information and Communication Technologies Sonia Livingstone NA The Communication Review https://doi.org/10.1080/10714420490280152 FALSE Literacy, Information literacy, The Internet
W1966809963 eHealth Literacy: Extending the Digital Divide to the Realm of Health Information Efrat Neter Esther Brainin Journal of Medical Internet Research https://doi.org/10.2196/jmir.1619 TRUE The Internet, Literacy, Health care
W2067508696 eHealth Literacy and Web 2.0 Health Information Seeking Behaviors Among Baby Boomers and Older Adults Bethany Tennant Julia M. Alber Journal of Medical Internet Research https://doi.org/10.2196/jmir.3992 TRUE Literacy, Population, The Internet

6 Búsqueda de trabajos citantes

Vamos a obtener ahora la lista de trabajos que citan el documento con el DOI 10.1007/s11192-008-2143-3. El identificador de OpenAlex que introducimos como parámetro en la búsqueda lo hemos obtenido al hacer la primera consulta.

data.7 <- openalexR::oa_fetch(entity = "works",
                             cites = "W3012538122")

data.7 %>% 
  show_works() %>%
  knitr::kable()
id display_name first_author last_author so url is_oa top_concepts
W4283835304 La sostenibilidad de los medios a través de los conceptos de engagement y relevancia: scoping review Llúcia Castells-Fos Lluís Codina Doxa https://doi.org/10.31921/doxacom.n35a1627 TRUE Humanities
W3049056629 Horizontes del mundo digital: de la simulación y la banalización de la experiencia, a un uso social, ecológico e innovador de la Sociedad Red David Caldevilla Domínguez Eduardo Parra López Cuadernos de Información y Comunicación https://doi.org/10.5209/ciyc.68722 TRUE Humanities
W3170698034 La publicidad en buscadores de las plataformas españolas de compraventa de trabajos académicos: análisis del tráfico, costes y palabras clave Rubén Comas-Forgas Mercedes Morey López Revista Espanola De Documentacion Cientifica https://doi.org/10.3989/redc.2021.3.1767 TRUE Humanities
W4210795731 Prólogo. Periodismo y algoritmos: de la era de la información a la era del algoritmo Lluís Codina Cristòfol Rovira Documentación de las Ciencias de la Información https://doi.org/10.5209/dcin.79269 TRUE Humanities
W3186502248 Media Concentration in Spain: National, sectorial, and regional groups Juan Pablo Artero Muñoz Sira Hernánez-Corchete Estudios Sobre El Mensaje Periodistico https://doi.org/10.5209/esmp.72928 TRUE Newspaper, Digital media, Media coverage

7 Exportación de registros

Por último, extraemos tres campos (título, revista y DOI) de los 5 documentos citantes y los exportamos a un fichero de texto que podemos abrir, por ejemplo, con Excel.

data.8 <- data.frame(data.7$display_name,
                     data.7$so,
                     data.7$url)

write.table(data.8,
            file = "info8",
            sep = ",",
            fileEncoding = 'utf-8')