After this workshop/exercise, you will have a better understanding of how to develop a perceptual mapping for brand/product positioning purposes using either survey data or qualitative data.
In addition, you will also try to learn how to design basic perceptual mapping questions for survey studies.
The first step is to collect your data. In this example, we collected Qualtrics survey data for the local groceries in Bakersfield, CA using a focus group. You may try to evaluate the attributes based on your group members’ perceptions of your project client’s business and the competition.
If you would like to follow my tutorial, I suggest that you think about using at least three attributes and follow the same data format (Columns:attributes; 1st Row: brands or products). Please open my sample data and see how it looks like.
In this exercise, we first calculate consumers’ average ratings for each attribute and then split the original survey dataset into two according to the education variable (1 and 0). The final datasets used for this analysis include those consumers who have at least a college degree (i.e., Bakersfield_Grocery1.csv) and those not (i.e., Bakersfield_Grocery2.csv).
The final output shows you how different grocery brands have been clustered in four quadrants to reflect how they are perceived in terms of several service attributes (Yelp Reviews, Convenience, Price or value, etc.).
library(devtools)
## Loading required package: usethis
install_github("vqv/ggbiplot")
## Downloading GitHub repo vqv/ggbiplot@HEAD
## colorspace (NA -> 2.0-3 ) [CRAN]
## viridisLite (NA -> 0.4.0 ) [CRAN]
## RColorBrewer (NA -> 1.1-2 ) [CRAN]
## munsell (NA -> 0.5.0 ) [CRAN]
## labeling (NA -> 0.4.2 ) [CRAN]
## farver (NA -> 2.1.0 ) [CRAN]
## Rcpp (NA -> 1.0.8.3) [CRAN]
## scales (NA -> 1.1.1 ) [CRAN]
## isoband (NA -> 0.2.5 ) [CRAN]
## gtable (NA -> 0.3.0 ) [CRAN]
## plyr (NA -> 1.8.7 ) [CRAN]
## ggplot2 (NA -> 3.3.5 ) [CRAN]
## Installing 12 packages: colorspace, viridisLite, RColorBrewer, munsell, labeling, farver, Rcpp, scales, isoband, gtable, plyr, ggplot2
## Installing packages into '/cloud/lib/x86_64-pc-linux-gnu-library/4.1'
## (as 'lib' is unspecified)
## * checking for file ‘/tmp/Rtmp4GX73M/remotes6e72e0f82c7/vqv-ggbiplot-7325e88/DESCRIPTION’ ... OK
## * preparing ‘ggbiplot’:
## * checking DESCRIPTION meta-information ... OK
## * checking for LF line-endings in source and make files and shell scripts
## * checking for empty or unneeded directories
## * looking to see if a ‘data/datalist’ file should be added
## * building ‘ggbiplot_0.55.tar.gz’
## Installing package into '/cloud/lib/x86_64-pc-linux-gnu-library/4.1'
## (as 'lib' is unspecified)
library(ggbiplot)
## Loading required package: ggplot2
## Loading required package: plyr
## Loading required package: scales
## Loading required package: grid
?ggbiplot #see the official introduction to this library
data <- read.csv("Bakersfield_Grocery1.csv", header=TRUE, row.names=1)
site.groups <- c(rep("a", 3), rep("b", 3),
rep("c", 3))
data.pca <- prcomp(data[,-1], scale. = TRUE)
data.pca <- prcomp(data, scale. = TRUE)
ggbiplot(data.pca, labels = rownames(data))
g1 <- ggbiplot(data.pca, obs.scale = 1, var.scale = 1,
groups = site.groups,
ellipse = TRUE, circle = TRUE, labels = rownames(data))
g1 <- g1 + scale_color_discrete(name = '')
g1 <- g1 + theme(legend.direction = 'horizontal',
legend.position = 'top')
print(g1)
library(devtools)
install_github("vqv/ggbiplot")
## Skipping install of 'ggbiplot' from a github remote, the SHA1 (7325e880) has not changed since last install.
## Use `force = TRUE` to force installation
library(ggbiplot)
data <- read.csv("Bakersfield_Grocery2.csv", header=TRUE, row.names=1)
site.groups <- c(rep("a", 3), rep("b", 3),
rep("c", 3))
data.pca <- prcomp(data[,-1], scale. = TRUE)
data.pca <- prcomp(data, scale. = TRUE)
ggbiplot(data.pca, labels = rownames(data))
g2 <- ggbiplot(data.pca, obs.scale = 1, var.scale = 1,
groups = site.groups,
ellipse = TRUE, circle = TRUE, labels = rownames(data))
g2 <- g2 + scale_color_discrete(name = '')
g2 <- g2 + theme(legend.direction = 'horizontal',
legend.position = 'top')
print(g2)
The sample size used for this survey exercise is small. That said, please do not try to generalize the results to the entire population.
Please keep in mind that for generalization purposes, we would usually need a survey from at least 30 customers for most statistical analysis.
Nenadic, O., & Greenacre, M. (2007). Correspondence analysis in R, with two-and three-dimensional graphics: the ca package. Journal of statistical software, 20(3). https://goedoc.uni-goettingen.de/bitstream/handle/1/5892/Nenadic.pdf?sequence=1
Sensographics and Mapping Consumer Perceptions Using PCA and FactoMineR. https://www.r-bloggers.com/2017/09/sensographics-and-mapping-consumer-perceptions-using-pca-and-factominer/
The Unavoidable Instability of Brand Image. https://www.r-bloggers.com/2014/06/the-unavoidable-instability-of-brand-image/
The R Project for Statistical Computing. https://www.r-project.org/
R for Data Science - Hadley Wickham. https://r4ds.had.co.nz/ R Markdown. https://rmarkdown.rstudio.com/
R Markdown: The Definitive Guide - Bookdown. https://bookdown.org/yihui/rmarkdown/