The txt data file is uploaded as pdf. If you just rename it back to txt, it is readable.
Running the code below gives me an error: cannot allocate vector of size 1130878.1 Gb. I don't understand. The dataframe is not even 1 MB by object.size(m3Spike)
place_fields.txt.pdf (357.5 KB)
knitr::opts_chunk$set(echo = TRUE)
library(ggplot2)
m3Spike = read.table('place_fields.txt', sep = ',')
ggplot(m3Spike, aes(x=V1, y=V2)) +
geom_raster(aes(fill=factor(V3))) +
scale_fill_manual(values=c("0"="white", "1"="black"))
ggplot(m3Spike, aes(x=V1, y=V2)) + geom_point()
works though.