library(needs)
needs(scholar, tidyverse, dtplyr, data.table, reticulate, pdftools, DT)
<- import("requests")
rq <- import("textract") textract
Literature searches
Load libraries
API keys
<- Sys.getenv("WOSLITE")
wos <- Sys.getenv("SEMANTICSCHOLAR_API")
s2 <- Sys.getenv("ncbi_key") ncbi_key
Searches
For literature searching I use Web of Science (WOS) and Semantic Scholar(Fricke 2018; Wade 2022; Lo et al. 2020).
Write 2 functions to use Semantic Scholar bulk search capability which searches titles and abstracts.
create_search
- construct API search callextract_fields
- takes the output ofcreate_search
and extracts field data as a tidy data frame
Semantic scholar bulk searching takes sophisticated query construction including Boolean operators.
<- function(query, fields, year){
create_search
require(reticulate)
<- import("requests")
rq
= glue::glue("http://partner.semanticscholar.org/graph/v1/paper/search/bulk?query=", {query}, "&fields=", {fields}, "&openAccessPdf&year=", {year}, "-")
url
= rq$get(url)$json()
r
}
<- function(out){
extract_fields
<- map_chr(out, "paperId")
paperIds
<- map_chr(out, "title")
titles
<- map(out, c("externalIds"))
externalIds
<- map_chr(externalIds, c("DOI"))
externalIds
<- map_dbl(out, "year")
year
<- map(out, "abstract")
abstract which(abstract == "NULL")] <- "NA"
abstract[<- enframe(abstract)
abstract
<- map_chr(out, "venue")
journal
<- map_dbl(out, "referenceCount")
ref_count
<- map_dbl(out, "citationCount")
citation_count <- map_dbl(out, "influentialCitationCount")
inf_cit_count
<- map(out, "openAccessPdf") |>
open_access_pdf enframe()
<- data.frame(paperIds = paperIds, title = titles, year = year,
results journal = journal, ref_count = ref_count,
citation_count = citation_count, inf_cit_count = inf_cit_count,
DOI = externalIds) |>
bind_cols(abs = abstract, pdf = open_access_pdf)
return(results)
}
What is the impact of Miyawaki urban ecological restoration methods on biodiversity?
= "(ecological restoration|nature based|miyawaki|tiny|pocket) AND forest AND (urban|city) AND (biodiversity|richness)"
query <- 2000
year <- "title,year,venue,abstract,externalIds,referenceCount,citationCount,influentialCitationCount,openAccessPdf"
fields
<- create_search(query = query, fields = fields, year = year) test
This query returns 90 results.
We can scan the titles and select those which look most relevant. (The enframe
function turns a list into a tibble with a name
column as a row_id and a value
column as the list data).
map_chr(test$data, "title") |>
enframe() |>
::kable() knitr
name | value |
---|---|
1 | Avian species richness in cities: A review of the Spanish-language literature from the Southern Cone of South America |
2 | Impacts of roads on woodland landscape connectivity: a case study of Gongyi City,Henan Province |
3 | A refuge between houses and buildings: reptiles in a peri-urban Atlantic Forest fragment in northeastern Brazil |
4 | Mathematical modeling as a tool for determination of tendencies in changes of humus concentration in soil of arable lands |
5 | Study towards Integrating Secondary Forests into Future Land Use Development in Singapore for Biodiversity Objectives |
6 | The resilient frugivorous fauna of an urban forest fragment and its potential role in vegetation enrichment |
7 | The Time for Insects Is Now |
8 | THEORETICAL PREREQUISITES FOR THE STUDY OF URBOECOLOGICAL INTERACTIONS IN MOUNTAIN SETTLEMENTS OF RECREATIONAL DIRECTION |
9 | Plant Community Degradation Inquiry and Ecological Restoration Design in South Lake Scenic Area of China |
10 | Bibliometric analysis of highly cited articles on ecosystem services |
11 | Distribution of the Carabid Species (Coleoptera, Carabidae) in Woodlands of the Protected and Urban Areas (North of Ukraine) |
12 | Bioresource and Stress Management |
13 | Pressures upon nature in Bosnia and Herzegovina: Assessment of their status and trends by groups of ecosystems |
14 | Short-term vegetation responses to the first prescribed burn in an urban pine rockland preserve |
15 | Unequal access to green space as a cause of a new category of health inequalities |
16 | Greening of Daycare Yards with Biodiverse Materials Affords Well-Being, Play and Environmental Relationships |
17 | Assessment of Restoration Potential in the Catchments ofPavana, Chaskaman and Dimbhe Dams in Northern Western Ghats |
18 | Soil microarthropod communities from Mediterranean forest ecosystems in Central Italy under different disturbances |
19 | REDD pilot project scenarios: are costs and benefits altered by spatial scale? |
20 | The Alps: An Environmental History. By Jon Mathieu |
21 | Cohabitation in Suburbia; Improving New Zealand’s Biodiversity through Suburban Environments |
22 | Global Change and Mountain Regions: An Overview of Current Knowledge |
23 | Future scenarios of land-use-cover effects on pollination supply and demand in São Paulo State, Brazil |
24 | Performance assessment of the ecosystem services provided by urban Nature-based solutions: focus on rainwater management |
25 | What evidence exists for the use of urban forest management in nature-based carbon solutions and bird conservation. A systematic map protocol |
26 | Afforestation of Urban Brownfields as a Nature-Based Solution. Experiences from a Project in Leipzig (Germany) |
27 | Study on land use change in Ge Yu city Nature Reserve |
28 | Multi-energy system smart tool for ecological water body restoration using an AI-based decision-making framework |
29 | Trends in Research on Forest Ecosystem Services in the Most Recent 20 Years: A Bibliometric Analysis |
30 | An Assessment of a Community-Based, Forest Restoration Programme in Durban (eThekwini), South Africa |
31 | THE INTEGRATION OF REMOTE SENSING AND GEOGRAPHIC INFORMATION SYSTEM (GIS) IN MANAGING URBAN ECOSYSTEMS |
32 | A Biological Comparison of Two Sites: An Ecological Approach using Community Ecology Metrics based on Insect Faunal Composition |
33 | Impacts of Tourism on the Coastal Environment of South China Sea: Terrestrial Perspective |
34 | Resources of dead wood in the municipal forests in Warsaw |
35 | Urban Wetlands and Riparian Forests as a Nature-Based Solution for Climate Change Adaptation in Cities and Their Surroundings |
36 | Avian species richness in cities: A review of the Spanish-language literature from the Southern Cone of South America |
37 | Indigenous knowledge: From local to global |
38 | Gender and the environment in the Guajara da costa river, Barcarena, Para (Paper 199) |
39 | Seeing the Forest for the Trees: A Review-Based Framework for Better Harmonization of Timber Production, Biodiversity, and Recreation in Boreal Urban Forests |
40 | Páramos de Costa Rica |
41 | Evolution and growth |
42 | Environmental interactions between people and birds in semiarid lands of the Zapotitlán Valley, Central Mexico |
43 | Changes in Plant Species Composition and Structure in Two Peri-urban Nature Preserves over 10 Years |
44 | Restoration Trajectories and Ecological Thresholds during Planted Urban Forest Successional Development |
45 | Observed and projected changes in urbanization and nature conservation in a typical fast growing city of Ethiopia, Jimma |
46 | Enhancing Quality of Life: Restorative Experience in Recreational Forests in Selangor, Malaysia |
47 | People-Centric Nature-Based Land Restoration through Agroforestry: A Typology |
48 | Disentangling effects of climate and land use on biodiversity and ecosystem services – a multi-scale experimental design |
49 | The Practice and Research of Water Protection of the Fuxian Lake in Yuxi City |
50 | A Survey of African Grey Parrots (Psittacus erithacus) Trade and Trafficking in |
51 | Arboreal community of an Atlantic Forest hillside fragment in São Sebastião/SP |
52 | Forests in a Changing World |
53 | Restoration of a degraded oak forest in Mexico City by introducing tree native species |
54 | Temporal Development and Regeneration Dynamics of Restored Urban Forests |
55 | Ecological, recreational and educational potential of a small artificial wetland in an urban environment |
56 | An Assessment of the Ecological Landscape Quality (ELQ) of Nature-Based Solutions (NBS) Based on Existing Elements of Green and Blue Infrastructure (GBI) |
57 | Nature-based Solutions in Bangladesh: Evidence of Effectiveness for Addressing Climate Change and Other Sustainable Development Goals |
58 | Habitat provision is a major driver of native bird communities in restored urban forests |
59 | Becoming Europe: Southeast Asia in the Anthropocene |
60 | Dog Walkers’ Views of Urban Biodiversity across Five European Cities |
61 | Ecological Responses to the 1980 Eruption of Mount St Helens |
62 | Nature-Based Urbanization: Scan Opportunities, Determine Directions and Create Inspiring Ecologies |
63 | Recarbonizing Global Soils for Sustainable Development |
64 | Assessment of tsunami damage on the .coastal vegetation in five selected districts in the coastal zone of Sri Lanka, after one and half years of tsunami |
65 | Presence of trace elements in sediment of Can Gio mangrove forest, Ho Chi Minh city, Vietnam |
66 | Evaluation Of The Two Model Biocorridors In Soth-West Part Of Slovakia In Agricultural Landscape |
67 | UDI editorial: designing green and blue infrastructure |
68 | Assessment of ecological water quality along a rural to urban land use gradient using benthic macroinvertebrate-based indexes |
69 | Influence des actions anthropiques sur la dynamique spatio-temporelle de l’occupation du sol dans la province du Bas-Congo (R.D. Congo). |
70 | Salutogenic Affordances and Sustainability: Multiple Benefits With Edible Forest Gardens in Urban Green Spaces |
71 | Urban biodiversity: State of the science and future directions |
72 | Urban Expansion Was the Main Driving Force for the Decline in Ecosystem Services in Hainan Island during 1980–2015 |
73 | Construction of Ecological Security Pattern for Plateau Lake Based on MSPA–MCR Model: A Case Study of Dianchi Lake Area |
74 | Insight into Bamboo-based Fermented Foods by Galo (Sub-tribe) of Arunachal Pradesh, India |
75 | Urban expansion in the Atlantic Forest: applying the Nature Futures Framework to develop a conceptual model and future scenarios |
76 | How urban forest can support Protected Areas connectivity? |
77 | Short-term vegetation responses to the first prescribed burn in an urban pine rockland preserve |
78 | Towards an integrative approach to evaluate the environmental ecosystem services provided by urban forest |
79 | Securing Wild Edible Plants for Planetary Healthy Diet |
80 | NBS Framework for Agricultural Landscapes |
81 | Towards an integrative approach to evaluate the environmental ecosystem services provided by urban forest |
82 | Vegetation Analysis and Silvicultural Suggestions for Mitigating Fire Danger and Protecting Nature the Case of a Natura 2000 Site in Southern Greece |
83 | Biodiversity based solutions for the support of ecosystem services, provided by urban green infrastructure |
84 | Human–wildlife interactions |
85 | Mapping and assessing ecosystems and their services: a comparative approach to ecosystem service supply in Suriname and French Guiana |
86 | The resilient frugivorous fauna of an urban forest fragment and its potential role in vegetation enrichment |
87 | Environmental Synergisms and Extinctions of Tropical Species |
88 | Periurban Areas in the Design of Supra-Municipal Strategies for Urban Green Infrastructures |
89 | Pathways to positive scenarios for the Amazon forest in Pará state, Brazil |
90 | Editorial |
We can now filter those results which seem most relevant (urban, native forests, Miyawaki method and biodiversity) and get more information with the extract_fields
function. Our search also returned a pdf link, so we can read the pdf text directly into our data frame in R for relevant articles.1
#| cache: true
## function to extract text from a pdf - this parses multi-column pdfs correctly
<- function(pdf){
pdf_ext
<- curl::curl_download(pdf, tempfile())
pdf
<- import("textract")
textract
<- textract$process(pdf) |>
pdfTxt py_to_r() |>
as.character()
}
<- safely(pdf_ext, otherwise = NA_real_) safe_pdf
Lets review abstracts…(field value…10
)
<- extract_fields(test$data[c(25, 26, 62, 71, 76, 83, 58, 30)]) |>
extract unnest_wider(value...12)
|>
extract unnest(value...10) |>
select(title, DOI, abstract = value...10) |>
::kable() knitr
title | DOI | abstract |
---|---|---|
What evidence exists for the use of urban forest management in nature-based carbon solutions and bird conservation. A systematic map protocol | 10.1186/s13750-022-00288-6 | NA |
Afforestation of Urban Brownfields as a Nature-Based Solution. Experiences from a Project in Leipzig (Germany) | 10.3390/land10090893 | In Leipzig, despite strong growth, reurbanization and re-densification, in the last decade it has still been possible for the city to green brownfields with a new type of green space: urban forests. The background to this was of course the city’s decades of shrinkage and the emergence of numerous brownfields. The city of Leipzig started urban redevelopment in 2001 and pursued the strategy “more green, less density” in its planning. This included the creation of traditional and new green spaces as well as temporary uses. New green space concepts were also experimented with, including pocket forests and urban forests on larger, inner-city brownfields. This pursued several objectives: the forest was meant to contribute to improving the urban climatic and air-hygienic situation, to enhance the value of adjacent areas, create new recreational opportunities and contribute to increasing biodiversity. Another aspect is also the financing, for instance, the afforestation of brownfields is the cheapest way to create greenery. As a result of almost ten years of interdisciplinary monitoring of the project, it can now be stated that urban forests fulfil the objectives and are accepted and used by the population. Urban forests do not constitute an independent or new type of nature-based solutions they create new ecosystems from existing abandoned, brownfields, or neglected area. |
Nature-Based Urbanization: Scan Opportunities, Determine Directions and Create Inspiring Ecologies | 10.3390/land10060651 | To base urbanization on nature, inspiring ecologies are necessary. The concept of nature-based solutions (NBS) could be helpful in achieving this goal. State of the art urban planning starts from the aim to realize a (part of) a city, not to improve natural quality or increase biodiversity. The aim of this article is to introduce a planning approach that puts the ecological landscape first, before embedding urban development. This ambition is explored using three NBS frameworks as the input for a series of design workshops, which conceived a regional plan for the Western Sydney Parklands in Australia. From these frameworks, elements were derived at three abstraction levels as the input for the design process: envisioning a long-term future (scanning the opportunities), evaluating the benefits and disadvantages, and identifying a common direction for the design (determining directions), and implementing concrete spatial cross-cutting solutions (creating inspiring ecologies), ultimately resulting in a regional landscape-based plan. The findings of this research demonstrate that, at every abstraction, a specific outcome is found: a mapped ecological landscape showing the options for urbanization, formulating a food-forest strategy as the commonly found direction for the design, and a regional plan that builds from the landscape ecologies adding layers of productive ecologies and urban synergies. By using NBS-frameworks, the potentials of putting the ecological landscape first in the planning process is illuminated, and urbanization can become resilient and nature-inclusive. Future research should emphasize the balance that should be established between the NBS-frameworks and the design approach, as an overly technocratic and all-encompassing framework prevents the freedom of thought that is needed to come to fruitful design propositions. |
Urban biodiversity: State of the science and future directions | 10.1007/s11252-022-01207-w | NA |
How urban forest can support Protected Areas connectivity? | 10.21203/rs.3.rs-1017653/v1 | The highly modified urban matrix becomes an inhospitable environment for many species because the natural vegetation fragments are highly fragmented and often isolated in the landscape. Protected Areas (PAs) located closer or within urban areas may not achieve their goal of protecting local or regional biodiversity. Thus, the proposition of ecological corridors aims to connect the PAs, providing the dispersion of species in anthropogenic landscapes. In this context, this study aimed to evaluate the PAs connectivity in an urban landscape and understand if urban forest fragments can support their connectivity, generating important information for biodiversity conservation and urban planning. For this, we used models based on Graph Theory to assess the functional connectivity among PAs. The focal species used were Atlantic Forest birds. We used the participatory technique to assess their dispersal capabilities, and this information was used to create a resistance surface map. The focal species movement in the landscape was modeled through Graph Theory. This model evaluated the functional connectivity and extracted the least-cost paths between PAs and other forest fragments that designed the urban ecological network. We identified that few PAs are connected in the urban landscape of Sorocaba city and its surroundings and 28 forest fragments that are important to support the connectivity among PAs. Among these, only four fragments are located within a PA. The other 24 forest fragments located outside PAs should be the center of attention for forest conservation and restoration actions, as they can improve the connectivity between the PAs. Our results show that PAs connectivity in urban landscapes depends on incentives for native vegetation conservation on private lands once most of the important forest fragments for the PAs connectivity are located in these areas. In addition, the restoration of riparian zones is important because they compose a great ecological corridor in the urban landscape. Strategies that increase the permeability of the matrix (e.g., increasing green spaces and gardens) and restoring target fragments are also important. Finally, land-use planning, focusing on natural ecosystem conservation and combating urban sprawl, is necessary to promote PAs connectivity in urban landscapes. |
Biodiversity based solutions for the support of ecosystem services, provided by urban green infrastructure | 10.36930/40320507 | Compact living of the population in the territory of modern cities on the one hand increases requirements for the quality of environmental conditions, and on the other hand creates an excessive load on the city ecosystem. Green spaces are the main providers of ecosystem services in cities, as urban fauna represented by a very limited number of species. The quality and range of ecosystems of their services, which provided by natural plant associations and urban green spaces, is significantly different and affected by human activity. The assessment of the quality of provision of ecosystem services by the parks of the left bank of the city was carried out Kyiv. At the first stage of the work, an assessment of the potential of service provision was carried out according to 10 criteria. At the second stage, the ratio between cultural and regulatory ecosystem services provided by the parks was performed using pair-wise weighted evaluation. The assessment results show that large, little-altered forest parks provide the highest degree of services, in which regulatory services dominate over recreational ones. Along with this, small lakes ecosystems under the condition of limited recreational improvement and use can also provide more services of a regulatory nature. Traditionally, the main means of ensuring the ecosystems services and adaptation of cities to the conditions of a changing climate are nature-based solutions. Given the scarcity of free space, such solutions include a number of conceptually new approaches that provide maximum involvement of spatial resources of the city, in particular walls and roofs. Such decisions are important and effective, but technical aspects may delay their implementation. Under such conditions it is proposed to pay attention to biodiversity-based solutions, i.e. increasing species richness in already existing facilities to improve the quality of the provided services in general and increase the weight of regulatory services. The attention should be paid to increasing the diversity of species and communities. The increase in species diversity can be implemented in planned manner maintenance of existing plantations taking into account not only the tolerance of the selected species, but also in accordance with their functional role. This will contribute to the expansion of ecological niches of plantations and natural processes of diversification. |
Habitat provision is a major driver of native bird communities in restored urban forests | 10.1111/1365-2656.13700 | Abstract Urbanization, and the drastic loss of habitat it entails, poses a major threat to global avian biodiversity. Ecological restoration of urban forests is therefore increasingly vital for native bird conservation, but control of invasive predators may also be needed to sustain native bird populations in cities where species invasions have been particularly severe. We evaluated restoration success by investigating changes in native bird communities along a restoration chronosequence of 25 restored urban forests representing 72 years of forest development, which we compared to two target reference systems and a control system. We hypothesized that total species richness and relative abundance of native forest birds would increase with the age of restoration planting. We further hypothesized that relative abundance of rats, possums and cats would negatively impact native birds, while amount of native forest in the surrounding landscape would have a positive effect. We used structural equation modelling (SEM) to investigate the relative influence of forest structure (complexity index, tree height, canopy openness, basal area, species richness and density), landscape attributes (patch area, perimeter length, landscape composition within three buffer zones, distance to the nearest road and water source) and invasive mammalian predator indices of relative abundance on total species richness and relative abundance of native forest birds. Species richness increased with age of restoration planting, with community composition progressing towards that found in target reference systems. SEM revealed that years restored was a direct driver of bird species richness but an indirect driver of abundance, which was directly driven by canopy openness. Contrary to our predictions, invasive mammals had no significant effect on native bird species richness or abundance. Our results demonstrate that provision and improvement of habitat quantity and quality through restoration is the vital first step to re‐establishing native forest bird communities in cities. |
An Assessment of a Community-Based, Forest Restoration Programme in Durban (eThekwini), South Africa | 10.3390/F8080255 | The restoration of degraded forests to enhance biodiversity, ecosystem services, as well as climate change mitigation and adaptation is now a major priority in cities around the world. This study evaluated the success of the Buffelsdraai Landfill Site Community Reforestation Project in Durban, South Africa, by assessing ecological attributes. Measures of plant richness, diversity, vegetation structure, invasive alien plants (IAPs) and ecological processes were contrasted across a chronosequence of habitats under restoration (0-year-old, 3-year-old and 5-year-old) and compared with a reference forest habitat (remnant natural forest). Native tree species recruitment and vegetation structure increased with restoration age. Ecological processes, represented by the composition of pollination and seed dispersal traits in all of the habitats under restoration, were similar to the reference habitat. However, low tree density and an increase in IAP cover with an increase in restoration age were identified as threats to reforestation success. We recommend enrichment planting and an effective IAP management strategy to promote more rapid habitat restoration while reducing site maintenance costs. Enrichment planting should not only focus on increasing tree species density and richness, but also on the inclusion of species with missing pollination and seed dispersal categories. |
Urban forest/ green biodiversity reviews
= "(urban|city) (forest|green) (biodiversity|richness) (systematic review|systematic map|meta analysis)"
query1
<- create_search(query = query1, fields = fields, year = year) urban_forest
I found 13 systematic reviews or meta-analyses of urban forest biodiversity.
extract_fields(urban_forest$data) |>
select(DOI, year, title) |>
::kable() knitr
DOI | year | title |
---|---|---|
10.1186/s40657-019-0168-3 | 2019 | A global consistent positive effect of urban green area size on bird richness |
10.1111/jse.12273 | 2017 | JSE IBC Special Issue on Frontiers in Plant Systematics and Evolution |
10.3390/rs70606683 | 2015 | Tracking Land Use/Land Cover Dynamics in Cloud Prone Areas Using Moderate Resolution Satellite Data: A Case Study in Central Africa |
10.1890/ES12-00262.1 | 2013 | A meta-analysis of the effects of urbanization on ground beetle communities |
10.2478/jlecol-2014-0011 | 2014 | Natural Ecosystem-Units in Israel and the Palestinian Authority - Representativeness in Protected Areas and Suggested Solutions for Biodiversity Conservation |
10.1007/s11027-021-09991-0 | 2022 | Climate change adaptation (CCA) research in Nepal: implications for the advancement of adaptation planning |
10.1111/conl.12768 | 2020 | Associations between socio‐environmental factors and landscape‐scale biodiversity recovery in naturally regenerating tropical and subtropical forests |
10.1111/gcb.13964 | 2018 | Non‐linearities in bird responses across urbanization gradients: A meta‐analysis |
10.11598/btb.2023.30.2.1780 | 2023 | SPATIAL DISTRIBUTION OF INVASIVE PLANTS IN BANDUNG, WEST JAVA, INDONESIA |
10.1093/aob/mcab135 | 2021 | Seed ecology of European mesic meadows. |
10.18174/499087 | 2019 | Wild ungulates as forest engineers |
10.1111/1365-2664.13475 | 2019 | The contribution of constructed green infrastructure to urban biodiversity: A synthesis and meta‐analysis |
10.21307/JOFNEM-2019-011 | 2019 | Agricultural intensification and urbanization negatively impact soil nematode richness and abundance: a meta-analysis |
Of these x seemed to be directly relevant. A systematic review by (Leveau et al. 2019) found that bird species richness is related to area of urban greenspace; (Batáry et al. 2017) demonstrated that bird diversity is non-linearly related to the degree of urbanisation; (Filazzola, Shrestha, and MacIvor 2019) in a review of 33 studies, found that there was no overall significant differences in biodiversity across a range of taxa for ‘constructed’ green infrastructure (gardens and allotments, green walls and roofs, roadside verges, swales and wetlands) and their ‘natural’ counterparts. There were some taxa specific effects in favour of GI - for example bird abundance and richness was reported lower in forest than urban garden environments and artificial rather than natural wetlands; arthropods were more abundant in gardens than meadows, in bioswale than natural wetland and green roofs than grassland.
(Martinson and Raupp 2013) showed urbanisation is detrimental to gound beetle diversity.
<- here::here("data")
p
<- fs::dir_ls(p, regexp = "csv")
f
<- read_csv(f[1]) gi_meta
Vegetation indices and. biodiversity
= "(vegetation index|NDVI) (biodiversity|richness) (predict|model|forecast)"
query2
<- create_search(query = query2, fields = fields, year = year) veg_bd
436
extract_fields(veg_bd$data) |>
select(DOI, year, title) |>
::datatable(filter = "top",
DTselection = list(mode = "multiple"))
Taxon specific
Butterflies and moths
= "(butterfly|moth) (biodiversity|richness) (urban)"
query3
<- create_search(query = query3, fields = fields, year = year)
lepid_bd
extract_fields(lepid_bd$data) |>
select(DOI, year, title) |>
::datatable(filter = "top",
DTselection = list(mode = "multiple"))
Bees and pollinators
= "(pollinator|bee|wasp|hoverfly) (biodiversity|richness) (urban)"
query4
<- create_search(query = query4, fields = fields, year = year)
pollinator_bd
extract_fields(pollinator_bd$data) |>
select(DOI, year, title) |>
::datatable(filter = "top",
DToptions = list(pageLength = 100,
selection = "multiple"))
Birds and mammals
= "(bird|avian|mammal) (biodiversity|richness) (urban)"
query5
<- create_search(query = query5, fields = fields, year = year)
bird_mammal_bd
extract_fields(bird_mammal_bd$data) |>
select(DOI, year, title) |>
::datatable(filter = "top",
DToptions = list(pageLength = 100,
selection = "multiple"))
References
Footnotes
Only if the pdfs are open access.↩︎