Data Input

library(readxl)
res <- read_excel("../Area F Round 3 Results.xlsx", 
  sheet = "Part1", col_types = c("numeric", "numeric", "numeric","numeric",
  "text", "numeric", "skip", "numeric", 
  "numeric", "numeric", "numeric", 
  "text", "numeric", "skip", "skip", 
  "numeric", "numeric", "numeric", 
  "skip", "numeric", "numeric", "numeric", 
  "numeric"))

Histograms by Neighborhood

Greater West Bench results by neighborhood. Only participants who rated at least one scenario

res$sA <- res$`Scenario A: Status Quo`
res$sB <- res$`Scenario B: Stable Population - Limited Improvements`
res$sC <- res$`Scenario C: Increased Population - Major Improvements`

res$areaF <- as.factor(res$Area)
for (a in levels(res$areaF)) {
  dat <- res[res$areaF==a & !is.na(res$sA), ]
  if (nrow(dat) > 0) {
    cat(a, " \n\n")
    par(mfrow=c(3,1))
    hist(dat$sA,
       main=paste(a, " A"),
       col="blue",
       freq=TRUE,
       )
    hist(dat$sB,
         main=paste(a, " B"),
         col="blue",
         freq=TRUE,
    )
    hist(dat$sC,
         main=paste(a, " C"),
         col="blue",
         freq=TRUE,
    )
  }
}
## Husula Highlands

## Sage Mesa

## West Bench

## Westwood Properties