1 Introduction

This note describes automating the discovery, collation and analysis of annual reports of the Director of Public Health (DPH reports). DPH reports are a statutory requirement for DsPH in local authorities.1

It is motivated by:

  1. The apparent lack of any central repository for DsPH reports
  2. The desire to measure impact of PHE products
  3. The need to base product development on user need
  4. The availability of tools and techniques for automation and analysis

Our hypothesis is that DsPH reports should be an important destination for Health Intelligence products for PHE, and that priorities and themes identified through annual reports should influence and be influenced by PHE and the Health Improvement Directorate

1.1 Methods

We have used two data science techniques - web-scraping and text analysis (natural langauge processing or NLP) - to try and create a repository of DPH annual reports which we can then analyse.

There are 4 steps

  1. Discovery - We need to be able to find DPH reports on the web.
  2. Web-sraping - if we can find reports or pages holding reports we can extract PDFs for further processing.
  3. Cleaning and processing - creating a ‘tidy’ data frame of reports, cleaning texts, adding metadata e.g. report year, local authority name
  4. Analysis - applying text mining and natural language processing tools to identify key themes, search for Health Intelligence products and so on.

To make this as automated as possible, all elements of the analytical pipeline have been conducted in R, and we have written functions and scripts to facilitate the process.

1.2 Workflow

The proposed workflow is set out below:

1.2.1 What is web-scraping

Web-scraping is a technique for extracting information from websites. For example there is list of current Directors of Public Health on .GOV.UK at https://www.gov.uk/government/publications/directors-of-public-health-in-england--2/directors-of-public-health-in-england.

This list can be automatically extracted and converted to a table:

dsph <- myScrapers::get_dsph_england()

dsph %>% write_csv("data/dsph.csv")

head(dsph, 20) %>%
  knitr::kable("html", caption = "DsPH in England") %>%
  kableExtra::kable_styling(full_width = T )
DsPH in England
LA Name
Derby UA Cate Edwynn
Derbyshire Dean Wallace
Leicester UA Ruth Tennant
Leicestershire Mike Sandys
Lincolnshire Derek Ward
Northamptonshire Lucy Wightman
Nottingham UA Alison Challenger
Nottinghamshire Jonathan Gribbin (acting/interim)
Rutland UA Mike Sandys
Bedford Borough Muriel Scott
Cambridgeshire Liz Robin
Central Bedfordshire UA Muriel Scott
Essex Mike Gogarty
Hertfordshire Jim McManus
Luton UA Gerry Taylor
Milton Keynes UA Muriel Scott
Norfolk (covers Great Yarmouth) Louise Smith
Peterborough UA Liz Robin
Southend on Sea UA Andrea Atherton
Suffolk (covers Waveney) Abdul Razaq

2 Discovery

The usual approach to discovering reports would be to search Google. We have written a googlesearchR function which takes a search term and returns a list of links as below. We can use this to search Google for DPH reports and return the Urls directly to R. At the moment it only returns the first 100 hits.

We will create a search string for each LA and then apply googlesearchR to try and identify the DPH annual reports

dsph <- myScrapers::get_dsph_england() %>% mutate(LA = str_replace_all(LA, "UA", ""))

## clean up la list

dsph <- dsph %>% mutate(LA = str_replace(LA, "Norfolk .+", "Norfolk"),  
                        LA = str_replace(LA, "Suffolk .+", "Suffolk"), 
                        row = row_number())

las <- pull(dsph, LA)

## create search list

u <- paste("director public health annual report", las)

u[1:10]
##  [1] "director public health annual report Derby "          
##  [2] "director public health annual report Derbyshire"      
##  [3] "director public health annual report Leicester "      
##  [4] "director public health annual report Leicestershire"  
##  [5] "director public health annual report Lincolnshire"    
##  [6] "director public health annual report Northamptonshire"
##  [7] "director public health annual report Nottingham "     
##  [8] "director public health annual report Nottinghamshire" 
##  [9] "director public health annual report Rutland "        
## [10] "director public health annual report Bedford Borough"

2.1 Try one search and retrieval

york <- u[152]

safe_google <- safely(googlesearchR)

## pull 5 results
york_test <-purrr::map(york, ~(safe_google(.x, n= 3)))

york_test1 <- york_test %>% map(., "result") 

york_test2 <- york_test1 %>% flatten() %>% map(., 1) %>%.[1:2]

york_test1
## [[1]]
## [[1]][[1]]
## [1] "https://www.york.gov.uk/info/20125/health_and_wellbeing/957/director_of_public_healths_annual_report"
## 
## [[1]][[2]]
## [1] "https://www.local.gov.uk/directors-public-health-annual-reports"
## 
## [[1]][[3]]
## [1] "http://www.nypartnerships.org.uk/dphreport2017"

The results are the same as a direct Google search

google screen shot

google screen shot

We can see that the search hasn’t given us a link to a downloadable report.

In some cases, the report is further linked to from another page. We can try and read the links on this page.

get_links <- function(url){
  
  page <- read_html(url) %>%
    html_nodes("a")  %>%
    html_attr("href") 
}

york1 <- unlist(york_test1[[1]][1], as.character)

york1
## [1] "https://www.york.gov.uk/info/20125/health_and_wellbeing/957/director_of_public_healths_annual_report"
safe_get_links <- safely(get_links)

york_links <- safe_get_links(york1)$result

york_links[1:20]
##  [1] "https://www.york.gov.uk/info/20125/health_and_wellbeing/957/director_of_public_healths_annual_report#content"                                  
##  [2] "https://www.york.gov.uk/info/20125/health_and_wellbeing/957/director_of_public_healths_annual_report#main-navigation"                          
##  [3] "/cookies"                                                                                                                                      
##  [4] "/cookies#managingcookies"                                                                                                                      
##  [5] "https://www.york.gov.uk"                                                                                                                       
##  [6] "https://www.york.gov.uk/info/20125/health_and_wellbeing/957/director_of_public_healths_annual_report#sidr-search"                              
##  [7] "https://www.york.gov.uk/info/20125/health_and_wellbeing/957/director_of_public_healths_annual_report#sidr-menu"                                
##  [8] "https://www.york.gov.uk/info/20003/your_council"                                                                                               
##  [9] "https://www.york.gov.uk/myaccount"                                                                                                             
## [10] "https://www.york.gov.uk/homepage/47/news_centre"                                                                                               
## [11] "https://www.york.gov.uk/homepage/14/jobs_training_and_volunteering"                                                                            
## [12] "https://www.york.gov.uk/homepage/16/contact_us"                                                                                                
## [13] "https://www.york.gov.uk/accessibility/settings"                                                                                                
## [14] "https://www.york.gov.uk/downloads/file/14761/director_of_public_healths_annual_report_2016-17"                                                 
## [15] "https://www.york.gov.uk/info/20139/health_and_wellbeing_partnerships/973/health_and_wellbeing_board"                                           
## [16] "http://www.healthyork.org/"                                                                                                                    
## [17] "https://www.york.gov.uk/info/20145/healthcare_services/991/healthcare_services"                                                                
## [18] "https://www.york.gov.uk/homepage/44/health_and_wellbeing"                                                                                      
## [19] "https://www.york.gov.uk/page_comments/L2luZm8vMjAxMjUvaGVhbHRoX2FuZF93ZWxsYmVpbmcvOTU3L2RpcmVjdG9yX29mX3B1YmxpY19oZWFsdGhzX2FubnVhbF9yZXBvcnQ="
## [20] "https://www.york.gov.uk/forms/20125/health_and_wellbeing"

We can see that there are a few links to the DPH report. The ‘downloads’ one looks promising.

We have written a get_docs to identify PDF or docx files on web pages - we can see if there is a downloadable document at https://www.york.gov.uk/downloads/file/14761/director_of_public_healths_annual_report_2016-17.

get_docs <- function(url){
  
  page <- read_html(url) %>%
    html_nodes("a")  %>%
    html_attr("href") %>%
    .[grepl("pdf$|docx$", .)]
  
}


safe_get_docs <- safely(get_docs)

york1 <- unlist(york_test1[[1]][1], as.character)

york1
## [1] "https://www.york.gov.uk/info/20125/health_and_wellbeing/957/director_of_public_healths_annual_report"
pdf_test <- map(york_links[14], ~(safe_get_docs(.x)) ) %>% map(., "result")

pdf_test
## [[1]]
## [1] "http://www.york.gov.uk/download/downloads/id/14761/director_of_public_healths_annual_report_2016-17.pdf"

This reveals a link to the 2016-17 report. The next step is to download the report.

3 Download

if(!dir.exists("dph_depot"))dir.create("dir_depot")
library(downloader)

safe_download <- safely(downloader::download)

pdf_test1 <- unlist(pdf_test)

basename(pdf_test1)
## [1] "director_of_public_healths_annual_report_2016-17.pdf"
# pdfs <- map(pdf_test, "result") 

pdf_download <- download(pdf_test1, mode = "wb", destfile = basename(pdf_test1))

This successfully downloads the report.

4 Extract and analyse

4.1 Reading into R

We can now read the file with readtext and analyse it further.

pdf_files <- list.files(pattern = ".pdf")

dph_report <- readtext(pdf_files[1])

dph_report
## readtext object consisting of 1 document and 0 docvars.
## # data.frame [1 × 2]
##   doc_id                                               text               
##   <chr>                                                <chr>              
## 1 director_of_public_healths_annual_report_2016-17.pdf "\"Director o\"..."

4.2 Text analysis

We can rapidly analyse the report

dph_report_corpus <- corpus(dph_report)

summary(dph_report_corpus)
## Corpus consisting of 1 document:
## 
##                                                  Text Types Tokens
##  director_of_public_healths_annual_report_2016-17.pdf  1333   6756
##  Sentences
##        153
## 
## Source: /Users/julianflowers/Documents/R_projects/my_scrapers/dph_reports/* on x86_64 by julianflowers
## Created: Sun Sep  2 16:06:39 2018
## Notes:

This shows that the report has 153 sentences and 6765 words.

4.3 Using a dictionary to count occurrences of key words

Going back to our original hypothesis we are interested in whether we can find references to PHE products like the public health dashboard, the PHOF, Fingertips and so on. We can create a dictionary of terms and search across all documents to count ocurrences and the estimate the proprtion of documents.

For example, for the York report we can search for: phe, fingertips, profile, localhealth, public_health_dashboard*, phof, outcomes_framework

dict <- dictionary(list(
  phe = "phe*", 
  fingertips = "fingertips*", 
  profile = "profile*", 
  local_health = "local*health*",
  phd = "public_health_dashboard*", 
  phof = c("phof", "outcomes_framework")))

dtm <- dfm(dph_report_corpus, remove = stopwords("en"), remove_punct = TRUE, ngrams = 1:3)

lookup <- dfm_lookup(dtm, dictionary = dict)


lookup %>% data.frame() %>%
  knitr::kable() %>%
  kableExtra::kable_styling(full_width = T )
document phe fingertips profile local_health phd phof
director_of_public_healths_annual_report_2016-17.pdf 0 6 33 4 0 2

There are 6 mentions of Fingertips and 4 of local health

kwic(dph_report_corpus, phrase("local health"))
##                                                                   
##  [director_of_public_healths_annual_report_2016-17.pdf, 4668:4669]
##  [director_of_public_healths_annual_report_2016-17.pdf, 6449:6450]
##                                                  
##            to and the quality of | local health |
##  outcomes• Public Health England | Local Health |
##                                     
##  services and effort. Shopping      
##  Profiles. on cardiovascular disease

This shows that one of the references to local health is to the PHE tool.

4.4 Word cloud

textplot_wordcloud(dtm)

5 Scaling up

Having outlined the process, the next step is to try and identify, download and analyse reports for all 152 local authorities. The basic process is the same but there are possible additional steps.

We’ll start by creating a search string in for each LA.

la <- dsph %>% pull(LA)
search_la <- paste0("director public health report ", la,  " pdf")

search_la[1:6]
## [1] "director public health report Derby  pdf"          
## [2] "director public health report Derbyshire pdf"      
## [3] "director public health report Leicester  pdf"      
## [4] "director public health report Leicestershire pdf"  
## [5] "director public health report Lincolnshire pdf"    
## [6] "director public health report Northamptonshire pdf"

We can now loop over each search to find the first few hits. To do this we’ll use the googlesearchR function from the myScrapers package. Initially we’ll look at the first 2 hits per page.

## test with 5 LAs

safe_google <- safely(googlesearchR)

reports <-purrr::map(search_la[1:5], ~(safe_google(.x, n= 2 )))
 
reports %>% map(., "result")
## [[1]]
## [[1]][[1]]
## [1] "https://www.derby.gov.uk/media/derbycitycouncil/contentassets/documents/adultsocialcare/jointstrategicneedsassessment/derbycitycouncil-director-public-health-annual-report-1718.pdf"
## 
## [[1]][[2]]
## [1] "https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2017.pdf"
## 
## 
## [[2]]
## [[2]][[1]]
## [1] "https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2016.pdf"
## 
## [[2]][[2]]
## [1] "https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2017.pdf"
## 
## 
## [[3]]
## [[3]][[1]]
## [1] "https://www.leicester.gov.uk/media/177395/director-of-public-health-annual-report-2013-2014.pdf"
## 
## [[3]][[2]]
## [1] "http://politics.leics.gov.uk/documents/s123729/Public%2520Health%2520annual%2520report.pdf"
## 
## 
## [[4]]
## [[4]][[1]]
## [1] "http://www.lsr-online.org/uploads/dph-annual-report-2017.pdf"
## 
## [[4]][[2]]
## [1] "http://www.lsr-online.org/uploads/director-of-public-health-annual-report-2016.pdf"
## 
## 
## [[5]]
## [[5]][[1]]
## [1] "http://www.boston.gov.uk/index.aspx"
## 
## [[5]][[2]]
## [1] "https://www.lincolnshire.gov.uk/health-and-wellbeing/information-for-professionals/health-data-policies-and-publications/annual-reports/129825.article"

In some cases we can see that the search returns a link to a PDF document, and there maybe more than one report per la.

5.1 Try for all

We’ll try and download all the reports - it seems to work better in batches.

reports1 <-purrr::map(search_la[1:10], ~(safe_google(.x, n= 2 )))
reports2 <- purrr::map(search_la[11:20], ~(safe_google(.x, n= 2 )))
reports3 <- purrr::map(search_la[21:30], ~(safe_google(.x, n= 2 )))
reports4 <- purrr::map(search_la[31:40], ~(safe_google(.x, n= 2 )))
reports5 <- purrr::map(search_la[41:50], ~(safe_google(.x, n= 2 )))
reports6 <- purrr::map(search_la[51:60], ~(safe_google(.x, n= 2 )))
reports7 <- purrr::map(search_la[61:70], ~(safe_google(.x, n= 2 )))
reports8 <- purrr::map(search_la[71:80], ~(safe_google(.x, n= 2 )))
reports9 <- purrr::map(search_la[81:90], ~(safe_google(.x, n= 2 )))
reports10 <- purrr::map(search_la[91:100], ~(safe_google(.x, n= 2 )))
reports11<- purrr::map(search_la[101:110], ~(safe_google(.x, n= 2 )))
reports12<- purrr::map(search_la[111:120], ~(safe_google(.x, n= 2 )))
reports13<- purrr::map(search_la[121:130], ~(safe_google(.x, n= 2 )))
reports14 <- purrr::map(search_la[131:140], ~(safe_google(.x, n= 2 )))
reports15 <- purrr::map(search_la[141:152], ~(safe_google(.x, n= 2 )))


# reports1 <- reports1 %>% map(., "result")
# 
# names(reports1) <- las[1:50]
# names(report2) <- las[51:100]
# names(report3) <- las[101:152]


## combine all into a single list

reports_all <-c(reports1, reports2, reports3, reports4, reports5,
                reports6, reports7, reports8, reports9, reports10, reports11, reports12, reports13, reports14, reports15)

reports_all <- map(reports_all, "result")
names(reports_all) <- las

head(reports_all)
## $`Derby `
## $`Derby `[[1]]
## [1] "https://www.derby.gov.uk/media/derbycitycouncil/contentassets/documents/adultsocialcare/jointstrategicneedsassessment/derbycitycouncil-director-public-health-annual-report-1718.pdf"
## 
## $`Derby `[[2]]
## [1] "https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2017.pdf"
## 
## 
## $Derbyshire
## $Derbyshire[[1]]
## [1] "https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2016.pdf"
## 
## $Derbyshire[[2]]
## [1] "https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2017.pdf"
## 
## $Derbyshire[[3]]
## [1] "http://www.google.co.uk/aclk?sa=l&ai=DChcSEwiGk7bjzJzdAhWqvO0KHcl7DDQYABAAGgJkZw&sig=AOD64_2DcvviI6t1glCWaSadgZelKUGFaA&ved=0ahUKEwjY-rHjzJzdAhUBBsAKHb7LA4EQ0QwIHw&adurl="
## 
## $Derbyshire[[4]]
## [1] "http://www.google.co.uk/aclk?sa=l&ai=DChcSEwiGk7bjzJzdAhWqvO0KHcl7DDQYABABGgJkZw&sig=AOD64_2uZws57Jvj7vRNb7LDCRa0mm_EFA&ved=0ahUKEwjY-rHjzJzdAhUBBsAKHb7LA4EQpigIJCgA&adurl="
## 
## $Derbyshire[[5]]
## [1] "http://www.google.co.uk/aclk?sa=l&ai=DChcSEwiGk7bjzJzdAhWqvO0KHcl7DDQYABACGgJkZw&sig=AOD64_2lpOcxxA6DdnXKggtVzTnYXQ4YJQ&ved=0ahUKEwjY-rHjzJzdAhUBBsAKHb7LA4EQpigIJSgB&adurl="
## 
## $Derbyshire[[6]]
## [1] "http://www.google.co.uk/aclk?sa=l&ai=DChcSEwiGk7bjzJzdAhWqvO0KHcl7DDQYABADGgJkZw&sig=AOD64_2cupvq-z7FXsBDxg7eosNMPk1QFQ&ved=0ahUKEwjY-rHjzJzdAhUBBsAKHb7LA4EQpigIJigC&adurl="
## 
## $Derbyshire[[7]]
## [1] "http://www.google.co.uk/aclk?sa=l&ai=DChcSEwiGk7bjzJzdAhWqvO0KHcl7DDQYABAEGgJkZw&sig=AOD64_2tjizyrdDxU0jLJ63BPM-Oc9VWZg&ved=0ahUKEwjY-rHjzJzdAhUBBsAKHb7LA4EQpigIJygD&adurl="
## 
## 
## $`Leicester `
## $`Leicester `[[1]]
## [1] "https://www.leicester.gov.uk/media/177395/director-of-public-health-annual-report-2013-2014.pdf"
## 
## $`Leicester `[[2]]
## [1] "https://www.leicester.gov.uk/media/184506/director-of-public-health-2018.pdf"
## 
## 
## $Leicestershire
## $Leicestershire[[1]]
## [1] "http://www.lsr-online.org/uploads/dph-annual-report-2017.pdf"
## 
## $Leicestershire[[2]]
## [1] "http://www.lsr-online.org/uploads/director-of-public-health-annual-report-2016.pdf"
## 
## 
## $Lincolnshire
## $Lincolnshire[[1]]
## [1] "http://www.boston.gov.uk/index.aspx"
## 
## $Lincolnshire[[2]]
## [1] "https://www.lincolnshire.gov.uk/health-and-wellbeing/information-for-professionals/health-data-policies-and-publications/annual-reports/129825.article"
## 
## 
## $Northamptonshire
## $Northamptonshire[[1]]
## [1] "https://www3.northamptonshire.gov.uk/councilservices/health/health-and-wellbeing-board/Documents/NCC%2520DPH%2520Report%2520Aug%25202017.pdf"
## 
## $Northamptonshire[[2]]
## [1] "https://www3.northamptonshire.gov.uk/councilservices/health/health-and-wellbeing-board/Pages/jsna-and-reports.aspx"
link1 <- reports_all %>%
  map(., 1)

link2 <-  reports_all %>%
  map(., 2)

links <- data.frame(cbind(link1, link2)) 

library(rlist)

name <- rlist::list.names(links)
test <- rlist::list.rbind(links)

links_table <- data.frame(cbind(la = name, test = links)) %>%
  gather(report, links, 2:3) %>%
  mutate(ispdf = str_detect(links, ".pdf$"))

pdfs_table <- filter(links_table, ispdf == TRUE) %>% arrange(la)


n_dph <- length(unique(pdfs_table$name))

We know have a set of links to at least 1 report for 0 LAs.

la report links ispdf
link1 test.link1 https://www.derby.gov.uk/media/derbycitycouncil/contentassets/documents/adultsocialcare/jointstrategicneedsassessment/derbycitycouncil-director-public-health-annual-report-1718.pdf TRUE
link1 test.link1 https://www.leicester.gov.uk/media/177395/director-of-public-health-annual-report-2013-2014.pdf TRUE
link1 test.link1 https://rutlandcounty.moderngov.co.uk/documents/s8309/Report%2520No.%2520762017%2520-%2520Appendix%2520A.pdf TRUE
link1 test.link1 https://cambridgeshireinsight.org.uk/wp-content/uploads/2017/08/Cambridgeshire-Annual-Public-Health-Report-2017.pdf TRUE
link1 test.link1 https://www.essex.gov.uk/Publications/Documents/Annual_Public_Health_Report_2014.pdf TRUE
link1 test.link1 https://www.norfolk.gov.uk/-/media/norfolk/downloads/what-we-do-and-how-we-work/policy-performance-and-partnerships/partnerships/strategic-member-forum/health-protocol-17-july-2017.pdf TRUE
link1 test.link1 http://www.southend.gov.uk/download/downloads/id/4668/annual_public_health_report_2015.pdf TRUE
link1 test.link1 https://www.thurrock.gov.uk/sites/default/files/assets/documents/annual_health_report_2017.pdf TRUE
link1 test.link1 https://barnet.moderngov.co.uk/documents/s44543/Annual%2520Report%2520-%2520Director%2520of%2520Public%2520Health.pdf TRUE
link1 test.link1 https://democracy.croydon.gov.uk/documents/s1572/Annual%2520Report%2520of%2520the%2520Director%2520of%2520Public%2520Health%25202017%2520-%2520draft.pdf TRUE
link1 test.link1 https://democraticservices.hounslow.gov.uk/documents/s105593/Director%2520of%2520Public%2520Health%2520and%2520Health%2520and%2520Wellbeing%2520Annual%2520Reports.pdf TRUE
link1 test.link1 https://www.westlondonccg.nhs.uk/media/10622/04.3)%2520APHR%25202013%2520-2014.pdf TRUE
link1 test.link1 http://www.southwark.gov.uk/assets/attach/2659/Annual%2520Report%2520of%2520the%2520Director%2520of%2520Public%2520Health%2520(2016).pdf TRUE
link1 test.link1 https://www2.merton.gov.uk/annual_public_health_report_2016.17.pdf TRUE
link1 test.link1 http://moderngov.southwark.gov.uk/documents/s66351/Appendix%25201%2520Annual%2520Report%2520of%2520the%2520Director%2520of%2520Public%2520Health%25202016.pdf TRUE
link1 test.link1 https://www.towerhamlets.gov.uk/Documents/Adult-care-services/Supporting-adults/Health/APHR-final-web.pdf TRUE
link1 test.link1 https://www.gateshead.gov.uk/media/4234/Director-of-Public-Health-Annual-Report-2017-18/pdf/1419-PS-DPH_Annual_Report_Final_web_2017-18.pdf TRUE
link1 test.link1 https://www.middlesbrough.gov.uk/sites/default/files/DPH%2520Annual%2520report%252013-14.pdf TRUE
link1 test.link1 https://www.redcar-cleveland.gov.uk/about-the-council/decision-making/Documents/Budget%2520Proposals%2520-%25202018-19.pdf TRUE
link1 test.link1 https://www.stockton.gov.uk/media/7412/director-of-public-health-report-14-15.pdf TRUE
link1 test.link1 https://www.blackburn.gov.uk/Public%2520health/Public%2520Health%2520Annual%2520Report%25202016_17%2520Final.pdf TRUE
link1 test.link1 https://www.cheshireeast.gov.uk/PDF/Annual-Public-Health-Report-2014-FINAL.pdf TRUE
link1 test.link1 https://www.knowsley.gov.uk/knowsleycouncil/media/Documents/Public-Health-Annual-Report-2016-17-Age-Well-(3)_6.pdf TRUE
link1 test.link1 https://www.liverpool.ac.uk/media/livacuk/instituteofpsychology/researchgroups/lpho/Top,Tips,14th,January,2015,V4,(2).pdf TRUE
link1 test.link1 https://www.sthelens.gov.uk/media/7456/final-1700138-public-health-annual-report-2016-17.pdf TRUE
link1 test.link1 http://tameside.moderngov.co.uk/documents/s27499/ITEM%25207%2520-%2520Final%25202017%2520Annual%2520Report%2520of%2520the%2520Director%2520of%2520Population%2520Health%2520-%2520FINAL.pdf TRUE
link1 test.link1 https://www.wirralintelligenceservice.org/media/2248/public_health_annual_report_2017.pdf TRUE
link1 test.link1 https://democratic.bracknell-forest.gov.uk/documents/s118833/Management%2520Arrangements%2520for%2520Public%2520Health.pdf TRUE
link1 test.link1 https://democracy.buckscc.gov.uk/documents/s102404/Director%2520of%2520Public%2520Health%2520Presentation%25201.pdf TRUE
link1 test.link1 https://democracy.hants.gov.uk/documents/s20996/Report.pdf TRUE
link1 test.link1 https://www2.oxfordshire.gov.uk/cms/sites/default/files/folders/documents/publichealth/PH_AR_2016-17.pdf TRUE
link1 test.link1 http://www.publichealth.southampton.gov.uk/images/southampton%2520phar%25202005.pdf TRUE
link1 test.link2 https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2017.pdf TRUE
link1 test.link2 https://www.leicester.gov.uk/media/184506/director-of-public-health-2018.pdf TRUE
link1 test.link2 https://rutlandcounty.moderngov.co.uk/documents/s11431/Report%2520No.%252046-2018%2520-%2520Appendix.pdf TRUE
link1 test.link2 https://www.healthwatchessex.org.uk/wp-content/uploads/2014/06/HWE-Annual-Report-16_17-lo-res-WEB.pdf TRUE
link1 test.link2 https://www.norfolk.gov.uk/-/media/norfolk/downloads/what-we-do-and-how-we-work/policy-performance-and-partnerships/policies-and-strategies/care-support-and-health/health/public-health-strategy-2016-2020.pdf TRUE
link1 test.link2 https://democracy.southend.gov.uk/documents/s10327/Annual%2520Public%2520Health%2520Report.pdf TRUE
link1 test.link2 https://barnet.moderngov.co.uk/documents/b30602/Appendix%2520-%2520Annual%2520Director%2520of%2520Public%2520Health%2520Report%252025th-Jan-2018%252009.00%2520Health%2520Wellbeing%2520Board.pdf TRUE
link1 test.link2 http://democracy.brent.gov.uk/documents/s70501/06.%2520Mental%2520Wellbeing%2520in%2520Brent.pdf TRUE
link1 test.link2 https://opendata.camden.gov.uk/download/h2ji-drqn/application/pdf TRUE
link1 test.link2 https://democracy.croydon.gov.uk/documents/s4663/Health%2520Protection%2520Update%2520Report.pdf TRUE
link1 test.link2 https://new.enfield.gov.uk/services/health/health-publications/health-publications/public-health-information-enfield-council-annual-public-health-report-2012.pdf TRUE
link1 test.link2 http://www.hscf.org.uk/resources/PJ58391_Public_Health_Annual_Report_FINAL.pdf TRUE
link1 test.link2 https://www.haringey.gov.uk/sites/haringeygovuk/files/ref_15_director_for_public_health.pdf TRUE
link1 test.link2 https://www.havering.gov.uk/download/downloads/id/2376/havering_director_of_public_health_annual_report_2017.pdf TRUE
link1 test.link2 https://democraticservices.hounslow.gov.uk/documents/s43433/Mike%2520Robinson%2520APHR%2520Presentation.pdf TRUE
link1 test.link2 https://www.jsna.info/sites/default/files/Public%2520Health%2520Annual%2520Report%2520WCC%2526RBKC%25202016-17.pdf TRUE
link1 test.link2 https://moderngov.lambeth.gov.uk/documents/s93424/Quarterly%2520ADPH%2520report%2520-%252023.01.18.pdf TRUE
link1 test.link2 https://democracy.merton.gov.uk/documents/s23457/Annual%2520Public%2520Health%2520Report%25202018.pdf TRUE
link1 test.link2 https://www.redbridge.gov.uk/media/4481/aphr-2017_v3.pdf TRUE
link1 test.link2 https://www.southwark.gov.uk/assets/attach/6328/Southwark%2520APHR%25202017%2520(Mar%25202018).pdf TRUE
link1 test.link2 https://www.towerhamlets.gov.uk/Documents/Public-Health/Health_Wellbeing_Strategy.pdf TRUE
link1 test.link2 https://www.gateshead.gov.uk/media/3316/Public-health-annual-report/pdf/DPH-Annual-Report-2016-17_(1).pdf TRUE
link1 test.link2 https://www.middlesbrough.gov.uk/sites/default/files/DPH%2520Annual%2520report%252014-15.pdf TRUE
link1 test.link2 https://my.northtyneside.gov.uk/sites/default/files/web-page-related-files/DPH%2520Annual%2520Report%2520201516%2520%2528March%25202017%2529.pdf TRUE
link1 test.link2 http://www.redcar-cleveland.gov.uk/cabpap17-18.nsf/580A5A0EE3520AFA80258224005844C0/%24File/Cabinet%2520Business%2520Paper%25206.2.18%2520website%2520version.pdf TRUE
link1 test.link2 https://www.easterncheshireccg.nhs.uk/downloads/publications/health-reports/Annual_Public_Health_Report_2012_-_FINAL_version.pdf TRUE
link1 test.link2 http://councilportal.cumbria.gov.uk/documents/s79820/Public%2520Health%2520Annual%2520Report.pdf TRUE
link1 test.link2 https://www.knowsley.gov.uk/knowsleycouncil/media/Documents/PHAR-2015-16-live-well-final.pdf TRUE
link1 test.link2 http://inspirewomenoldham.co.uk/wp-content/uploads/2017/12/Public_Health_Annual_Report_2017_NCM.pdf TRUE
link1 test.link2 https://www.cqc.org.uk/sites/default/files/20160520_salford_place_report_appendix_final_02.pdf TRUE
link1 test.link2 http://tameside.moderngov.co.uk/documents/s27498/ITEM%25207%2520-%2520PHAR%25202017%2520FINAL.pdf TRUE
link1 test.link2 https://www.warrington.gov.uk/download/downloads/id/10901/public-health-annual-report-2016.pdf TRUE
link1 test.link2 https://www.wirralintelligenceservice.org/media/1186/public-health-annual-report-2015-16.pdf TRUE
link1 test.link2 https://democratic.bracknell-forest.gov.uk/documents/s118730/Establishment%2520of%2520an%2520Appointment%2520Committee%2520-%2520Director%2520of%2520Public%2520Health.pdf TRUE
link1 test.link2 https://www.kent.gov.uk/__data/assets/pdf_file/0014/12470/Job-description-Director-of-Public-Health.pdf TRUE
link1 test.link2 https://www2.oxfordshire.gov.uk/cms/sites/default/files/folders/documents/publichealth/2016-17DPHAnnualReportforHOSC.pdf TRUE
link1 test.link2 http://www.reading.gov.uk/media/6957/Annual-Report-Reading/pdf/Annual_Report_Reading_FINAL.pdf TRUE
link1 test.link2 http://www.publichealth.southampton.gov.uk/images/southampton-phar-2015-final-full-report.pdf TRUE
link2 test.link1 https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2016.pdf TRUE
link2 test.link1 http://www.lsr-online.org/uploads/dph-annual-report-2017.pdf TRUE
link2 test.link1 https://www3.northamptonshire.gov.uk/councilservices/health/health-and-wellbeing-board/Documents/NCC%2520DPH%2520Report%2520Aug%25202017.pdf TRUE
link2 test.link1 https://centralbeds.moderngov.co.uk/documents/s69951/Appendix%2520A%2520-%2520Annual%2520Public%2520Health%2520Report%2520by%2520the%2520Director%2520of%2520Public%2520Health.pdf TRUE
link2 test.link1 https://www.hertfordshire.gov.uk/media-library/documents/public-health/professionals/hertfordshires-director-of-public-health-annual-report-2013-2014.pdf TRUE
link2 test.link1 https://www.bexley.gov.uk/sites/bexley-cms/files/2018-02/Senior-Managers-Structure-Chart-January-2018.pdf TRUE
link2 test.link1 http://oxleas.nhs.uk/site-media/cms-downloads/Greenwich_Health_and_Wellbeing_Strategy_2015-18.pdf TRUE
link2 test.link1 https://www.lbhf.gov.uk/sites/default/files/section_attachments/the_roads_to_wellbeing_directors_annual_health_report_2017.pdf TRUE
link2 test.link1 https://barnet.moderngov.co.uk/documents/s44543/Annual%2520Report%2520-%2520Director%2520of%2520Public%2520Health.pdf TRUE
link2 test.link1 https://www.hillingdon.gov.uk/media/25985/Section-5---The-health-of-the-environment/pdf/Director_of_Public_Health_Annual_Report_2011_12_section5.pdf TRUE
link2 test.link1 http://councilmeetings.lewisham.gov.uk/documents/s46372/Item%25206%2520-%2520Lewisham%2520Annual%2520Public%2520Health%2520Report%25202016%2520-%252015%252011%252016.pdf TRUE
link2 test.link1 https://www.richmond.gov.uk/media/10924/annual_public_health_report_2014_15.pdf TRUE
link2 test.link1 https://moderngov.sutton.gov.uk/documents/s46655/The%2520Director%2520of%2520Public%2520Healths%2520Annual%2520Report.pdf TRUE
link2 test.link1 https://democracy.walthamforest.gov.uk/documents/s46223/DPH%2520Staffing%2520Committee%2520Report%2520April%25202015%2520-%2520Permanent%2520Director%2520of%2520Public%2520Health.pdf TRUE
link2 test.link1 https://committees.westminster.gov.uk/documents/s23716/6%2520-%2520Draft%2520Annual%2520Director%2520of%2520Public%2520Health%2520Report.pdf TRUE
link2 test.link1 http://www.durham.gov.uk/media/4851/Annual-Report-of-the-Director-of-Public-Health-for-County-Durham/pdf/AnnualReportDirectorOfPublicHealthForCountyDurham.pdf TRUE
link2 test.link1 https://www.newcastle.gov.uk/sites/default/files/wwwfileroot/social-care-and-support/health-and-wellbeing/dph_annual_report_2015_final.pdf TRUE
link2 test.link1 http://committeedocs.northumberland.gov.uk/MeetingDocs/36270_M7982.pdf TRUE
link2 test.link1 https://www.sunderland.gov.uk/media/20338/Director-of-Public-Health-Annual-Report-2016-2017/pdf/oce21135_Sunderland_Public_Health_Annual_Report_2016-17_A4.pdf TRUE
link2 test.link1 http://www.adph.org.uk/wp-content/uploads/2017/12/bury_public_health_annual_report_2016.pdf TRUE
link2 test.link1 http://www.adph.org.uk/wp-content/uploads/2017/05/Halton.pdf TRUE
link2 test.link1 http://www.lancashire.gov.uk/media/898725/securing-our-health-and-wellbeing-report-of-the-dphw-2016.pdf TRUE
link2 test.link1 https://www.trafford.gov.uk/residents/health-social-care-and-support/health-and-wellbeing/public-health/docs/Public-Health-Annual-Report-2016-17.pdf TRUE
link2 test.link1 https://www.wigan.gov.uk/Docs/PDF/Council/Strategies-Plans-and-Policies/Public-Health-annual-reports/Public-Health-Report-2016.pdf TRUE
link2 test.link1 https://www.iwight.com/Meetings/committees/Health%2520and%2520Wellbeing%2520Board/19-10-17/PAPER%2520D%2520-%2520APPENDIX%25201%2520-%2520%2520PH%2520Annual%2520Public%2520Health%2520Report%25202016-17%2520FINAL%2520COPY.pdf TRUE
link2 test.link1 https://democracy.portsmouth.gov.uk/documents/s16325/PHAR%2520appendix%2520-%2520draft%2520document.pdf TRUE
link2 test.link1 http://www.slough.gov.uk/moderngov/documents/s41820/Appendix%2520A%2520-%2520Public%2520Health%2520Annual%2520Report.pdf TRUE
link2 test.link1 http://www.surreydownsccg.nhs.uk/media/163828/07-public-health-annual-report.pdf TRUE
link2 test.link1 https://rbwm.moderngov.co.uk/documents/s15342/RBWM%2520Annual%2520Report%25202017%2520Briefing%2520Note.pdf TRUE
link2 test.link2 https://www.derbyshire.gov.uk/site-elements/documents/pdf/social-health/health-and-wellbeing/about-public-health/director-of-public-health-annual-report-2017.pdf TRUE
link2 test.link2 http://www.lsr-online.org/uploads/director-of-public-health-annual-report-2016.pdf TRUE
link2 test.link2 http://www.nottinghamshire.gov.uk/media/129275/dph-annual-report-2017-final.pdf TRUE
link2 test.link2 https://centralbeds.moderngov.co.uk/documents/s69951/Appendix%2520A%2520-%2520Annual%2520Public%2520Health%2520Report%2520by%2520the%2520Director%2520of%2520Public%2520Health.pdf TRUE
link2 test.link2 https://centralbeds.moderngov.co.uk/documents/s51843/Annual%2520Director%2520of%2520Public%2520Health%2520Report%2520-%2520Appendix%2520A.pdf TRUE
link2 test.link2 https://www.hertfordshire.gov.uk/media-library/documents/about-the-council/data-and-information/key-accountabilities-director-public-health.pdf TRUE
link2 test.link2 https://www.peterborough.gov.uk/upload/www.peterborough.gov.uk/healthcare/public-health/AnnualReport-PowerPoint-version-1-7-Final-Version.pdf TRUE
link2 test.link2 https://www.healthysuffolk.org.uk/uploads/21991-APHR-2016-ONLINE.pdf TRUE
link2 test.link2 https://www.lbbd.gov.uk/sites/default/files/attachments/LBBD-Annual-Health-Report-2016-17.pdf TRUE
link2 test.link2 https://cds.bromley.gov.uk/documents/s50032862/PUBLIC%2520HEALTH%2520PROGRAMMES%2520UPDATEPART%25201%2520REPORT%2520TEMPLATE.pdf TRUE
link2 test.link2 https://barnet.moderngov.co.uk/documents/s44543/Annual%2520Report%2520-%2520Director%2520of%2520Public%2520Health.pdf TRUE
link2 test.link2 https://www.ealing.gov.uk/download/downloads/id/13063/annual_public_health_report_2017-18.pdf TRUE
link2 test.link2 https://healthwatchgreenwich.co.uk/wp-content/uploads/2018/04/Healthwatch-Greenwich-Annual-Report-2017-18.pdf TRUE
link2 test.link2 https://barnet.moderngov.co.uk/documents/s40533/Creation%2520of%2520Director%2520of%2520Public%2520Health%2520Post%2520-%2520Adults%2520Communities%2520Health%2520Department.pdf TRUE
link2 test.link2 https://www.hillingdon.gov.uk/media/25982/Section-2---Maintaining-and-improving-the-health-and-wellbeing-of-children-in-the-cold-climate/pdf/Director_of_Public_Health_Annual_Report_2011_12_section2.pdf TRUE
link2 test.link2 https://democracy.islington.gov.uk/documents/s12224/2499.8%2520Public%2520Health%2520Annual%2520report%25202017_V5a.pdf TRUE
link2 test.link2 http://www.lewishamjsna.org.uk/sites/default/files/Lewisham%2520Annual%2520Public%2520Health%2520Report%25202015.pdf TRUE
link2 test.link2 https://moderngov.sutton.gov.uk/documents/s28841/Public%2520Health%2520report.pdf TRUE
link2 test.link2 https://www.hartlepool.gov.uk/download/downloads/id/1440/director_of_public_health_annual_report_201415.pdf TRUE
link2 test.link2 https://www.newcastle.gov.uk/sites/default/files/wwwfileroot/social-care-and-support/health-and-wellbeing/annual_report_of_the_director_of_public_health_for_newcastle_2014_final.pdf TRUE
link2 test.link2 http://committeedocs.northumberland.gov.uk/MeetingDocs/29207_M7961.pdf TRUE
link2 test.link2 https://www.sunderland.gov.uk/media/19696/Director-of-Public-Health-Annual-Report/pdf/DPH_Report_2015_(FINAL_VERSION).pdf TRUE
link2 test.link2 https://councildecisions.bury.gov.uk/documents/s14047/V6%2520Draft%2520Health%2520and%2520Wellbeing%2520Board%2520Annual%2520Report%25202016-17.pdf TRUE
link2 test.link2 http://councillors.halton.gov.uk/documents/s51919/EXECUTIVE_BOARD_REPORT_WORKPLACE%2520HEALTH%25202018.pdf TRUE
link2 test.link2 http://council.lancashire.gov.uk/documents/s103115/Minutes.pdf TRUE
link2 test.link2 http://www.gmhsc.org.uk/assets/08-Public-Health-System-Reform-Full-Report-Exec-Summary-FINAL-v2.pdf TRUE
link2 test.link2 http://www.rochdale.gov.uk/pdf/2015-05-08-JD-and-PS-Director-Public-Health-v2.pdf TRUE
link2 test.link2 http://modgov.sefton.gov.uk/moderngov/documents/s83700/Sefton%2520Public%2520Health%2520Annual%2520Report%25202017.pdf TRUE
link2 test.link2 https://www.trafford.gov.uk/residents/health-social-care-and-support/health-and-wellbeing/public-health/docs/public-health-annual-report-2015.pdf TRUE
link2 test.link2 https://www.wigan.gov.uk/Docs/PDF/Council/Strategies-Plans-and-Policies/Public-Health-annual-reports/Public-Health-Annual-Report-2008-2009.pdf TRUE
link2 test.link2 https://democracy.eastsussex.gov.uk/documents/s11867/Item%25207%2520Health%2520and%2520Wellbeing%2520Board%2520November%252028%25202016-17%2520Director%2520of%2520Public%2520Health%2520Report.pdf TRUE
link2 test.link2 https://www.iow.gov.uk/jobVacancies/vacancyPacks/50044867-Director-of-Public-Health-JD-FINAL.pdf TRUE
link2 test.link2 https://democracy.portsmouth.gov.uk/documents/s9432/public%2520health%2520annual%2520report%2520Appendix%2520A.pdf TRUE
link2 test.link2 http://www.slough.gov.uk/downloads/Slough-DPH-annual-report-2017.pdf TRUE
link2 test.link2 https://www3.rbwm.gov.uk/publichealth/download/downloads/id/127/public_health_annual_report.pdf TRUE

5.2 Try to download pdfs

We can try to read pdfs directly or download and then read them

safe_readtext <- safely(readtext)

pdfs_links <- pdfs_table %>% pull(links)

docs <- map(pdfs_links, ~(safe_readtext(.x)))
docs1 <- map(docs, "result")
docs1 <- map_df(docs1, data.frame)

5.3 Corpus

corpus_dph <- corpus(docs1)

setDT(summary(corpus_dph)) %>%
  ggplot(aes(Sentences))+
  geom_density(fill = "goldenrod") +
  govstyle::theme_gov()

dict <- dictionary(list(
  phe = "phe*", 
  fingertips = "fingertips*", 
  profile = "profile*", 
  local_health = "local*health*",
  phd = "public_health_dashboard*", 
  phof = c("phof", "outcomes_framework"), 
  mental = "mental_health", 
  cancer = "cancer",
  smoking = c("tobacco", "smok*"), 
  alcohol = c("alcohol", "drink*"), 
  sugar = "sugar*"))

dtm1 <- dfm(corpus_dph, remove = stopwords("en"), remove_punct = TRUE, ngrams = 1:3)

lookup1 <- dfm_lookup(dtm1, dictionary = dict)

topfeatures(dtm1, 30)
##        health        people        of_the        public        in_the 
##         22069          6983          6434          6369          5343 
## public_health      children         local      services    health_and 
##          5331          4581          4386          4172          4116 
##          care        report       england        mental           can 
##          3965          3588          3489          3438          3421 
##    population       support     wellbeing         years        social 
##          3281          3077          3068          2971          2895 
##          year          work          life          also         young 
##          2770          2670          2536          2509          2459 
##       healthy mental_health        to_the       smoking             1 
##          2450          2394          2361          2334          2325
lookup1 %>% data.frame() %>%
  knitr::kable() %>%
  kableExtra::kable_styling(full_width = T )
document phe fingertips profile local_health phd phof mental cancer smoking alcohol sugar
derbycitycouncil-director-public-health-annual-report-1718.pdf 3 0 0 1 0 1 18 12 132 55 24
director-of-public-health-annual-report-2013-2014.pdf 15 0 33 7 0 10 59 62 414 199 0
Report%2520No.%2520762017%2520-%2520Appendix%2520A.pdf 0 0 33 0 0 1 13 4 28 5 0
Cambridgeshire-Annual-Public-Health-Report-2017.pdf 0 0 9 3 0 12 13 0 89 16 0
Annual_Public_Health_Report_2014.pdf 0 0 9 2 0 0 21 2 36 18 3
health-protocol-17-july-2017.pdf 21 0 0 7 0 0 5 1 3 1 0
annual_public_health_report_2015.pdf 27 0 15 2 0 1 19 9 85 16 0
annual_health_report_2017.pdf 0 0 6 0 0 0 13 0 3 11 0
Annual%2520Report%2520-%2520Director%2520of%2520Public%2520Health.pdf 0 0 0 0 0 0 0 0 0 0 0
Annual%2520Report%2520of%2520the%2520Director%2520of%2520Public%2520Health%25202017%2520-%2520draft.pdf 0 18 66 0 0 0 14 0 6 6 0
annual_public_health_report_2016.17.pdf 9 0 6 2 0 1 3 1 0 52 72
APHR-final-web.pdf 0 0 0 10 0 0 32 342 285 157 3
1419-PS-DPH_Annual_Report_Final_web_2017-18.pdf 6 18 27 6 0 3 46 4 365 58 3
director-of-public-health-report-14-15.pdf 6 0 6 0 0 0 23 5 54 101 6
Annual-Public-Health-Report-2014-FINAL.pdf 39 0 45 19 0 7 69 2 624 139 3
Public-Health-Annual-Report-2016-17-Age-Well-(3)_6.pdf 0 0 3 2 0 0 17 7 85 42 6
Top,Tips,14th,January,2015,V4,(2).pdf 24 15 27 7 0 2 88 26 469 156 3
final-1700138-public-health-annual-report-2016-17.pdf 0 0 0 2 0 0 3 0 0 300 0
ITEM%25207%2520-%2520Final%25202017%2520Annual%2520Report%2520of%2520the%2520Director%2520of%2520Population%2520Health%2520-%2520FINAL.pdf 24 0 0 0 0 0 0 3 22 3 0
public_health_annual_report_2017.pdf 3 3 0 18 0 2 3 70 96 50 0
Management%2520Arrangements%2520for%2520Public%2520Health.pdf 30 0 0 21 0 0 1 0 12 2 0
Director%2520of%2520Public%2520Health%2520Presentation%25201.pdf 0 0 3 0 0 0 11 1 39 3 0
Report.pdf 0 0 0 0 0 0 0 0 0 0 0
PH_AR_2016-17.pdf 6 0 6 4 0 1 35 9 113 76 18
director-of-public-health-annual-report-2017.pdf 45 0 3 8 0 0 5 8 3 9 0
director-of-public-health-2018.pdf 0 0 0 0 0 0 0 0 0 0 0
Report%2520No.%252046-2018%2520-%2520Appendix.pdf 21 9 15 3 0 2 4 4 18 4 0
HWE-Annual-Report-16_17-lo-res-WEB.pdf 0 0 3 5 0 0 32 3 3 1 0
public-health-strategy-2016-2020.pdf 0 0 0 4 0 0 12 0 99 31 0
Annual%2520Public%2520Health%2520Report.pdf 30 24 3 32 0 3 1 45 3 12 0
Appendix%2520-%2520Annual%2520Director%2520of%2520Public%2520Health%2520Report%252025th-Jan-2018%252009.00%2520Health%2520Wellbeing%2520Board.pdf 0 0 0 0 0 0 0 0 0 0 0
06.%2520Mental%2520Wellbeing%2520in%2520Brent.pdf 0 0 3 0 0 2 16 0 0 0 0
Health%2520Protection%2520Update%2520Report.pdf 6 0 0 2 0 0 0 0 0 0 0
public-health-information-enfield-council-annual-public-health-report-2012.pdf 12 0 81 25 0 12 14 64 253 98 9
PJ58391_Public_Health_Annual_Report_FINAL.pdf 0 3 30 0 0 2 138 3 130 80 0
ref_15_director_for_public_health.pdf 0 0 0 0 0 0 0 0 0 1 0
havering_director_of_public_health_annual_report_2017.pdf 0 0 3 0 0 0 5 1 0 12 6
Quarterly%2520ADPH%2520report%2520-%252023.01.18.pdf 12 0 3 3 2 1 1 0 11 4 0
Annual%2520Public%2520Health%2520Report%25202018.pdf 6 0 0 2 0 0 0 0 3 0 0
aphr-2017_v3.pdf 15 15 66 11 0 3 14 38 389 115 33
Health_Wellbeing_Strategy.pdf 0 0 0 0 0 0 9 1 9 7 0
DPH-Annual-Report-2016-17_(1).pdf 18 0 9 2 0 0 42 26 1218 7 0
Annual_Public_Health_Report_2012_-_FINAL_version.pdf 3 0 9 10 0 20 28 19 325 176 9
Public%2520Health%2520Annual%2520Report.pdf 0 0 9 8 0 0 18 5 136 20 0
PHAR-2015-16-live-well-final.pdf 0 0 6 2 0 1 45 56 281 83 3
Public_Health_Annual_Report_2017_NCM.pdf 3 0 24 0 0 0 17 3 55 60 18
20160520_salford_place_report_appendix_final_02.pdf 147 126 60 2 0 18 152 7 21 27 0
ITEM%25207%2520-%2520PHAR%25202017%2520FINAL.pdf 0 0 0 0 0 0 0 0 0 0 0
public-health-annual-report-2016.pdf 42 0 12 8 0 2 9 24 289 88 27
public-health-annual-report-2015-16.pdf 0 0 0 0 0 0 3 0 0 22 0
Establishment%2520of%2520an%2520Appointment%2520Committee%2520-%2520Director%2520of%2520Public%2520Health.pdf 3 0 0 1 0 0 0 0 0 0 0
Job-description-Director-of-Public-Health.pdf 0 0 0 4 0 0 0 0 3 1 0
2016-17DPHAnnualReportforHOSC.pdf 6 0 15 3 0 2 24 7 145 80 15
Annual_Report_Reading_FINAL.pdf 3 0 0 0 0 1 10 1 48 1 0
southampton-phar-2015-final-full-report.pdf 6 0 21 2 0 0 46 3 626 127 24
director-of-public-health-annual-report-2016.pdf 3 0 0 8 0 1 12 2 3 9 0
dph-annual-report-2017.pdf 33 21 39 12 0 6 8 16 80 30 0
Appendix%2520A%2520-%2520Annual%2520Public%2520Health%2520Report%2520by%2520the%2520Director%2520of%2520Public%2520Health.pdf 6 0 27 3 0 2 73 2 157 35 0
hertfordshires-director-of-public-health-annual-report-2013-2014.pdf 0 0 0 4 0 0 5 48 382 222 0
Senior-Managers-Structure-Chart-January-2018.pdf 0 0 0 0 0 0 0 0 0 0 0
Greenwich_Health_and_Wellbeing_Strategy_2015-18.pdf 3 0 0 4 0 0 37 1 27 4 0
the_roads_to_wellbeing_directors_annual_health_report_2017.pdf 0 0 15 6 0 0 85 0 0 0 0
Annual%2520Report%2520-%2520Director%2520of%2520Public%2520Health.pdf.1 0 0 0 0 0 0 0 0 0 0 0
Director_of_Public_Health_Annual_Report_2011_12_section5.pdf 0 0 3 2 0 0 3 0 6 6 0
Item%25206%2520-%2520Lewisham%2520Annual%2520Public%2520Health%2520Report%25202016%2520-%252015%252011%252016.pdf 0 0 3 0 0 0 0 0 1 0 6
annual_public_health_report_2014_15.pdf 0 3 30 0 0 29 50 22 101 42 0
The%2520Director%2520of%2520Public%2520Healths%2520Annual%2520Report.pdf 0 0 0 0 0 0 0 0 0 2 0
DPH%2520Staffing%2520Committee%2520Report%2520April%25202015%2520-%2520Permanent%2520Director%2520of%2520Public%2520Health.pdf 0 0 0 0 0 0 0 0 0 0 0
6%2520-%2520Draft%2520Annual%2520Director%2520of%2520Public%2520Health%2520Report.pdf 0 3 15 6 0 0 108 1 0 0 0
AnnualReportDirectorOfPublicHealthForCountyDurham.pdf 3 0 66 13 0 26 55 77 349 160 3
dph_annual_report_2015_final.pdf 6 3 24 3 0 2 14 7 104 21 6
36270_M7982.pdf 0 0 0 0 0 0 0 0 3 0 0
oce21135_Sunderland_Public_Health_Annual_Report_2016-17_A4.pdf 15 0 0 2 0 6 28 15 49 37 3
bury_public_health_annual_report_2016.pdf 0 0 3 2 0 4 29 3 124 19 0
Halton.pdf 0 0 0 8 0 0 2 24 33 1018 12
securing-our-health-and-wellbeing-report-of-the-dphw-2016.pdf 3 0 0 2 0 0 3 10 33 20 0
Public-Health-Annual-Report-2016-17.pdf 3 24 51 1 0 0 22 11 136 43 6
Public-Health-Report-2016.pdf 3 0 3 0 0 0 1 0 0 2 0
PHAR%2520appendix%2520-%2520draft%2520document.pdf 0 11 33 2 0 3 1 5 60 49 12
Appendix%2520A%2520-%2520Public%2520Health%2520Annual%2520Report.pdf 0 0 3 2 0 2 10 1 51 1 0
07-public-health-annual-report.pdf 0 3 9 0 0 0 20 2 16 6 0
RBWM%2520Annual%2520Report%25202017%2520Briefing%2520Note.pdf 0 0 0 2 0 0 0 0 29 16 0
director-of-public-health-annual-report-2017.pdf.1 45 0 3 8 0 0 5 8 3 9 0
director-of-public-health-annual-report-2016.pdf.1 0 0 39 0 0 1 12 3 50 13 0
dph-annual-report-2017-final.pdf 15 3 6 5 0 10 14 21 64 5 0
Appendix%2520A%2520-%2520Annual%2520Public%2520Health%2520Report%2520by%2520the%2520Director%2520of%2520Public%2520Health.pdf.1 6 0 27 3 0 2 73 2 157 35 0
Annual%2520Director%2520of%2520Public%2520Health%2520Report%2520-%2520Appendix%2520A.pdf 0 0 21 1 0 2 190 6 99 22 0
key-accountabilities-director-public-health.pdf 0 0 0 0 0 0 0 0 0 0 0
21991-APHR-2016-ONLINE.pdf 0 0 0 0 0 0 75 1 33 11 0
LBBD-Annual-Health-Report-2016-17.pdf 0 3 33 5 0 3 52 1 30 21 0
PUBLIC%2520HEALTH%2520PROGRAMMES%2520UPDATEPART%25201%2520REPORT%2520TEMPLATE.pdf 3 0 12 2 0 5 2 5 108 1 3
Annual%2520Report%2520-%2520Director%2520of%2520Public%2520Health.pdf.2 0 0 0 0 0 0 0 0 0 0 0
annual_public_health_report_2017-18.pdf 0 6 9 0 0 0 0 2 9 2 0
Healthwatch-Greenwich-Annual-Report-2017-18.pdf 0 0 0 7 0 0 10 1 0 0 0
Creation%2520of%2520Director%2520of%2520Public%2520Health%2520Post%2520-%2520Adults%2520Communities%2520Health%2520Department.pdf 0 0 0 2 0 0 0 0 0 1 0
Director_of_Public_Health_Annual_Report_2011_12_section2.pdf 3 0 6 16 0 0 15 9 14 28 9
2499.8%2520Public%2520Health%2520Annual%2520report%25202017_V5a.pdf 0 3 9 10 0 1 17 6 554 105 6
Public%2520Health%2520report.pdf 0 0 12 4 0 0 2 4 12 15 0
director_of_public_health_annual_report_201415.pdf 0 0 3 0 0 7 25 3 0 0 0
annual_report_of_the_director_of_public_health_for_newcastle_2014_final.pdf 3 0 24 9 0 6 25 14 145 34 21
29207_M7961.pdf 0 0 0 2 0 0 0 0 0 0 0
DPH_Report_2015_(FINAL_VERSION).pdf 0 0 21 11 0 2 31 9 356 25 3
V6%2520Draft%2520Health%2520and%2520Wellbeing%2520Board%2520Annual%2520Report%25202016-17.pdf 0 0 9 1 0 3 0 0 2 1 0
EXECUTIVE_BOARD_REPORT_WORKPLACE%2520HEALTH%25202018.pdf 3 0 0 0 0 0 38 3 3 0 0
Minutes.pdf 0 0 0 0 0 0 0 0 0 0 0
08-Public-Health-System-Reform-Full-Report-Exec-Summary-FINAL-v2.pdf 93 0 6 6 0 10 9 2 23 9 0
2015-05-08-JD-and-PS-Director-Public-Health-v2.pdf 0 0 0 4 0 1 0 0 1 1 0
public-health-annual-report-2015.pdf 6 3 24 1 0 0 19 9 49 26 0
Public-Health-Annual-Report-2008-2009.pdf 3 0 30 4 0 0 28 44 163 118 3
Item%25207%2520Health%2520and%2520Wellbeing%2520Board%2520November%252028%25202016-17%2520Director%2520of%2520Public%2520Health%2520Report.pdf 0 0 0 0 0 0 1 0 0 0 0
50044867-Director-of-Public-Health-JD-FINAL.pdf 0 0 0 5 0 0 0 0 3 1 0
public%2520health%2520annual%2520report%2520Appendix%2520A.pdf 0 0 0 0 0 0 3 1 6 1 0
Slough-DPH-annual-report-2017.pdf 42 0 21 0 0 9 6 30 261 107 0
public_health_annual_report.pdf 0 24 69 1 0 0 25 2 3 0 0

  1. The annual report is the DPH’s professional statement about the health of local communities, based on sound epidemiological evidence, and interpreted objectively. The report should be useful for both professionals and the public. However it is not just the annual review of public health outcomes and activity. The annual report is an important vehicle by which DsPH can identify key issues, flag up problems, report progress and thereby serve their local populations. It will also be a key resource to inform stakeholders of priorities and recommend actions to improve and protect the health of the communities they serve. It will be a tool for advocacy as well as a statement of needs, current priorities and action and continuing progress. It can also be a valuable process for internal reflection and team prioritisation as well as external engagement and awareness raising. http://www.adph.org.uk/wp-content/uploads/2013/08/DPH-Annual-Report-guidelines.pdf