library(tidyverse)
library(knitr)
library(ggthemes)
# Data importation and wrangling
dat <- read.csv('response.csv')

dat$Discord <- sapply(str_split(dat$Which.platforms.do.you.use.to.interact.with.the.MiSTer.community., ", "), function(x) "Discord" %in% x)
dat$Facebook <- sapply(str_split(dat$Which.platforms.do.you.use.to.interact.with.the.MiSTer.community., ", "), function(x) "Facebook" %in% x)
dat$Reddit <- sapply(str_split(dat$Which.platforms.do.you.use.to.interact.with.the.MiSTer.community., ", "), function(x) "Reddit" %in% x)
dat$Twitter <- sapply(str_split(dat$Which.platforms.do.you.use.to.interact.with.the.MiSTer.community., ", "), function(x) "Twitter" %in% x)
dat$Forum <- sapply(str_split(dat$Which.platforms.do.you.use.to.interact.with.the.MiSTer.community., ", "), function(x) "MiSTerFPGA.org" %in% x)
# Function to make Google Sheets suck less
sum_other <- function(dat, nonunique, split = ", ") {
  n <- length(nonunique)
  out <- data.frame(matrix(0, ncol = 2, nrow = n + 1))
  out[,1] <- c(nonunique, "Other")
  set <- str_split(dat, split)
  for (i in 1:n) {
    out[i, 2] <- sum(sapply(set, function(x) nonunique[i] %in% x))
  }
  out[n + 1, 2] <- sum(sapply(set, function(x) length(setdiff(x, nonunique)) != 0))
  return(out)
}

Introduction

This is a summary of the results of the unofficial survey conducted to better learn and understand the demographics and interests of the MiSTer community. After cleaning up the data there were 1,165 responses, which is way more than I ever could have expected. Thank you all so much for your participation. Many questions had the option to submit a personalized response. These have been included at the end of this document. The order of these responses has been randomized (and sometimes also sorted by response type). This version includes the code used to produce the plots found here. You can find the original here.

Demographic information

# How did you find this survey

social <- c('#7BC950', '#DE639A', '#1877f2', '#7289da', '#FF5700', '#1DA1F2')

sum_other(dat$How.did.you.find.this.survey.,
          c("Discord", "Facebook", "Twitter", "Reddit", "MiSTerFPGA.org")) %>%
  arrange(desc(X2)) %>%
  mutate(pos = cumsum(X2) - X2 / 2,
         colr = c("1", 2, 1, 1, 2, 2),
                  perc = paste0(round(X2 / sum(X2) * 100, 2), "%")) %>%
  ggplot(aes(x = "", y = X2, fill = reorder(X1, X2))) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  scale_fill_manual(values = social) +
  labs(title = "How Participants Found This Survey",
       fill = "Source") +
  geom_text(aes(y = pos, label = perc, vjust = -12)) +
  geom_text(aes(y = pos, label = X1, angle = 45, color = colr)) +
  scale_color_manual(values = c("#FFFFFF", "#000000")) +
  coord_flip() +
  theme(legend.position = "none",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank())

Most of the “Other” sources are from forums like \(\texttt{circuit-board.de}\) and \(\texttt{rllmukforum.com}\).


sum_other(dat$Which.platforms.do.you.use.to.interact.with.the.MiSTer.community.,
          c("Discord", "Facebook", "Twitter", "Reddit", "MiSTerFPGA.org")) %>%
  mutate(p =  X2 / sum(dat$Which.platforms.do.you.use.to.interact.with.the.MiSTer.community. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Social Media Platform Usage Rates Among Participants",
       x = "Social media platform",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  #      aspect.ratio = 2 / 5) +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

Common “Other” responses include Youtube, GitHub, Patreon, 4Chan, Telegram, and assorted forums. Also, one user added “Tinder” so the rest of us need to start doing our part.


social <- social[c(4, 3, 2, 1, 5, 6)]

ages <- dat %>%
  filter(What.is.your.age.in.years. < 80,
         What.is.your.age.in.years. > 12)

ages %>%
  ggplot(aes(x = What.is.your.age.in.years., fill = TRUE)) +
  geom_histogram(binwidth = 0.5) +
  theme_pander() +
  scale_fill_pander() +
  labs(title = "Age Distribution",
       x = "Age",
       y = "Count") +
  theme(legend.position = "none")

dat %>%
  filter(What.is.your.age.in.years. < 75,
         What.is.your.age.in.years. > 12) %>%
  mutate(find = case_when(How.did.you.find.this.survey. %in% c("Discord", "Facebook", "Twitter", "Reddit", "MiSTerFPGA.org") ~ How.did.you.find.this.survey.,
                          TRUE ~ "Other")) %>%
  ggplot(aes(x = What.is.your.age.in.years., fill = find)) +
  geom_histogram(binwidth = 0.5) +
  theme_pander() +
  scale_fill_manual(values = social) +
  facet_wrap(vars(find), scales = "free") +
  labs(title = "Age Distribution by Participant Source",
       x = "Age",
       y = "Count") +
  theme(legend.position = "none")

Unsurprisingly, the age distribution is centered around 40 and is approximately normal. Interestingly, there is a large spike at exactly 40 and 41 which I have no explanation for (If it were just at 40 I’d assume people were rounding). Also of note is that the Reddit demographic seems to skew younger and the Facebook demographic seems to skew older.


sum_other(dat$What.best.captures.your.line.of.work.study., c("Computer Science", "Computer Engineering", "Other STEM", "Humanities")) %>%
  arrange(desc(X2)) %>%
  mutate(pos = cumsum(X2) - X2 / 2,
         colr = c("1", 1, 2, 2, 2),
         perc = paste0(round(X2 / sum(X2) * 100, 2), "%")) %>%
  ggplot(aes(x = "", y = X2, fill = reorder(X1, X2))) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  scale_fill_pander() +
  labs(title = "Line of Work/Study",
       fill = "Source") +
  geom_text(aes(y = pos, label = perc, vjust = -12)) +
  geom_text(aes(y = pos, label = X1, angle = 45, color = colr)) +
  scale_colour_manual(values = c("#FFFFFF", "#000000")) +
  coord_flip() +
  theme(legend.position = "none",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank())

I knew when I added this question that it was far too broad; I just wasn’t sure how granular to be because I knew I’d miss something important. I still did, anyways because I’ve been in academia for too long and didn’t even consider things like retail, construction, religious work, and retirement. Many of the “Other” responses could have fit into the provided categories, but you can’t really blame people for wanting their profession to appear directly (and “STEM” might not be something everyone is familiar with) . The responses are impressively varied and I’d invite you to peruse them at least briefly to get a feel for just how far-reaching this often stereotyped hobby actually is.


sum_other(dat$To.which.gender.identity.do.you.most.identify., c("Male", "Female", "Prefer not to say", "Gender Variant/Non-Conforming")) %>%
  arrange(desc(X2)) %>%
  mutate(X1 = ordered(X1,
                      levels = c("Male",
                                 "Female",
                                 "Gender Variant/Non-Conforming",
                                 "Prefer not to say",
                                 "Other"))) %>%
  ggplot(aes(x = "", y = X2, fill = X1)) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  scale_fill_manual(values = c("#81D4FA",
                               "#F48FB1",
                               "#CE93D8",
                               "#FFE082",
                               "#B0BEC5")) +
  labs(title = "Gender identity",
       fill = "") +
  coord_flip() +
  theme(legend.position = "bottom",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank()) +
  guides(fill = guide_legend(reverse = TRUE))

sum_other(dat$To.which.gender.identity.do.you.most.identify., c("Male", "Female", "Prefer not to say", "Gender Variant/Non-Conforming")) %>%
  arrange(desc(X2)) %>%
  mutate(Percentage = paste0(round(X2 / sum(X2) * 100, 2), "%")) %>%
  select(X1, Percentage) %>%
  kable(col.names = NULL)
Male 92.94%
Prefer not to say 2.76%
Female 1.89%
Gender Variant/Non-Conforming 1.29%
Other 1.12%

Not much to say here other than that I wasn’t expecting it to be quite so overwhelmingly male.


Platforms

dat %>%
  mutate(mod = str_replace_all(Which.mediums.do.you.use.to.play.retro.games..Select.all.that.apply.,
                           fixed("Software emulation (e.g. Retroarch, Raspberry Pi, NES Classic Edition)"),
                           "Software emulation")) %>%
  mutate(mod = str_replace_all(mod,
                           fixed("Hardware emulation (e.g. MiSTer, Analogue Mega SG, AVS)"),
                           "Hardware emulation")) %>%
  filter(mod != "") %>%
  pull(mod) %>%
  sum_other(c("Original hardware",
              "Software emulation",
              "Hardware emulation",
              "I don't know")) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Which.mediums.do.you.use.to.play.retro.games..Select.all.that.apply. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Medium Usage Rates",
       x = "Medium",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

Unfortunately I didn’t separate MiSTer from other hardware emulation, so that particular metric isn’t very useful. I did find it interesting that so few users reported using software emulation.


cores <- dat %>%
  mutate(mod = str_replace_all(Which.of.the.following.platforms.did.you.regularly.use.either.in.your.youth.or.during.their.commercial.lifespan..Select.all.that.apply.,
                               fixed("BBC Micro B,Master"),
                               "BBC Micro B/Master")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 16, Plus/4"),
                               "Commodore 16/Plus/4")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 64, Ultimax"),
                               "Commodore 64/Ultimax")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Color Computer 2, Dragon 32"),
                               "Color Computer 2/Dragon 32")) %>%
  filter(mod != "") %>%
  pull(mod) %>%
  str_split(", ") %>%
  unlist() %>%
  unique()

dat %>%
  mutate(mod = str_replace_all(Which.of.the.following.platforms.did.you.regularly.use.either.in.your.youth.or.during.their.commercial.lifespan..Select.all.that.apply.,
                               fixed("BBC Micro B,Master"),
                               "BBC Micro B/Master")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 16, Plus/4"),
                               "Commodore 16/Plus/4")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 64, Ultimax"),
                               "Commodore 64/Ultimax")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Color Computer 2, Dragon 32"),
                               "Color Computer 2/Dragon 32")) %>%
  filter(mod != "") %>%
  pull(mod) %>%
  sum_other(cores) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Which.mediums.do.you.use.to.play.retro.games..Select.all.that.apply. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Platform Use During Youth/Commercial Lifespan",
       x = "Platform",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

cores <- dat %>%
  mutate(mod = str_replace_all(Which.of.the.following.platforms.do.you.regularly.use.via.MiSTer..Select.all.that.apply.,
                               fixed("BBC Micro B,Master"),
                               "BBC Micro B/Master")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 16, Plus/4"),
                               "Commodore 16/Plus/4")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 64, Ultimax"),
                               "Commodore 64/Ultimax")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Color Computer 2, Dragon 32"),
                               "Color Computer 2/Dragon 32")) %>%
  filter(mod != "") %>%
  pull(mod) %>%
  str_split(", ") %>%
  unlist() %>%
  unique()

dat %>%
  mutate(mod = str_replace_all(Which.of.the.following.platforms.do.you.regularly.use.via.MiSTer..Select.all.that.apply.,
                               fixed("BBC Micro B,Master"),
                               "BBC Micro B/Master")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 16, Plus/4"),
                               "Commodore 16/Plus/4")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 64, Ultimax"),
                               "Commodore 64/Ultimax")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Color Computer 2, Dragon 32"),
                               "Color Computer 2/Dragon 32")) %>%
  filter(mod != "") %>%
  pull(mod) %>%
  sum_other(cores) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Which.mediums.do.you.use.to.play.retro.games..Select.all.that.apply. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Platform Use With MiSTer",
       x = "Platform",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

old_plats <- dat %>%
  mutate(mod = str_replace_all(Which.of.the.following.platforms.did.you.regularly.use.either.in.your.youth.or.during.their.commercial.lifespan..Select.all.that.apply.,
                               fixed("BBC Micro B,Master"),
                               "BBC Micro B/Master")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 16, Plus/4"),
                               "Commodore 16/Plus/4")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 64, Ultimax"),
                               "Commodore 64/Ultimax")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Color Computer 2, Dragon 32"),
                               "Color Computer 2/Dragon 32")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("NeoGeo (AES)"),
                               "NeoGeo")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("NeoGeo (MVS)"),
                               "NeoGeo")) %>%
  filter(mod != "") %>%
  pull(mod)

new_plats <- dat %>%
  mutate(mod = str_replace_all(Which.of.the.following.platforms.do.you.regularly.use.via.MiSTer..Select.all.that.apply.,
                               fixed("BBC Micro B,Master"),
                               "BBC Micro B/Master")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 16, Plus/4"),
                               "Commodore 16/Plus/4")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Commodore 64, Ultimax"),
                               "Commodore 64/Ultimax")) %>%
  mutate(mod = str_replace_all(mod,
                               fixed("Color Computer 2, Dragon 32"),
                               "Color Computer 2/Dragon 32")) %>%
  filter(mod != "") %>%
  pull(mod)

cores <- new_plats %>%
  str_split(", ") %>%
  unlist() %>%
  unique()

full_join(sum_other(old_plats, cores), sum_other(new_plats, cores), by="X1") %>%
  filter(X2.x != 0,
         X2.y != 0 ) %>%
  mutate(difference = X2.y - X2.x) %>%
  arrange(desc(difference)) %>%
  ggplot(aes(x = reorder(X1, difference), y = difference, fill = difference)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_gradient2(low = "#F44336", mid = "#90A4AE", high = "#81C784") + 
  coord_flip() +
  labs(title = "Platform Use Disparity",
       x = "Platform",
       y = "Difference in participant count") +
  theme(legend.position = "none")

The first two plots are hopefully self-explanatory. The last one is the difference between the values from the first two, so higher values mean a platform is being used a lot more now via MiSTer than it used to be among participants. It tries to capture which platforms are the “hidden gems” (or in the Neo Geo’s case, can finally be afforded) and which platforms were only popular for their time. The ao486 core was not included in this final plot because I had users report using it originally as “DOS”, and the ao486 core isn’t only used with DOS. The Gameboy may also be low because some people reported all use of the Gameboy core as Gameboy Color. If this survey is ever repeated, the two should be combined.


dat %>%
  filter(Did.you.regularly.play.arcade.games.growing.up. != "") %>%
  group_by(Did.you.regularly.play.arcade.games.growing.up.) %>%
  tally() %>%
  mutate(pos = cumsum(n) - n / 2) %>%
  mutate(pos = sum(n) - pos) %>%
  ggplot(aes(x = "", y = n, fill = Did.you.regularly.play.arcade.games.growing.up.)) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  labs(title = "Did you regularly play arcade games growing up?",
       fill = "") +
  coord_flip() +
  theme(legend.position = "bottom",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank()) +
  guides(fill = guide_legend(reverse = TRUE)) +
  scale_fill_manual(values = c("#E57373",
                               "#81C784")) +
  geom_text(aes(y = pos, label = paste0(round(n / sum(n) * 100, 2), "%"), vjust = -12))

I tried breaking this down by how users found the survey, but it’s fairly consistent across platforms.


valid <- dat %>%
  filter(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.at.home..Select.all.that.apply. != "") %>%
  pull(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.at.home..Select.all.that.apply.) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.at.home..Select.all.that.apply. != "") %>%
  pull(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.at.home..Select.all.that.apply.) %>%
  sum_other(valid) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.at.home..Select.all.that.apply. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Genres Played at Home During Platform Lifespan",
       x = "Genre",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

dat_clean <- dat %>%
  mutate(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.in.the.arcade..Select.all.that.apply. = str_replace_all(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.in.the.arcade..Select.all.that.apply.,
                               fixed("Arcade classics (e.g. Pac-Man, Centipede, Dig Dug)"),
                               "Arcade classics"))

valid <- dat_clean %>%
  filter(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.in.the.arcade..Select.all.that.apply. != "") %>%
  pull(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.in.the.arcade..Select.all.that.apply.) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat_clean %>%
  filter(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.in.the.arcade..Select.all.that.apply. != "") %>%
  pull(During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.in.the.arcade..Select.all.that.apply.) %>%
  sum_other(valid) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$During.the.commercial.lifespan.of.these.platforms..which.genres.did.you.tend.to.play.in.the.arcade..Select.all.that.apply. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Genres Played in the Arcade During Platform Lifespan",
       x = "Genre",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))


Hardware setups

dat %>%
  ggplot(aes(x = How.many.DE10.Nano.devices.do.you.own.for.use.as.MiSTer.setups..If.you.don.t.know.what.that.means..put.the.number.of.MiSTer.builds.you.own., fill = TRUE)) +
  geom_histogram(binwidth = 0.5) +
  theme_pander() +
  scale_fill_pander() +
  labs(title = "How many DE10-Nano devices do you own?",
       x = "Number of DE10-Nano boards",
       y = "Frequency") +
  theme(legend.position = "none")


dat %>%
  summarize(across(14:22, function(x) sum(x == "Yes") / sum(x %in% c("Yes", "No")))) %>%
  mutate(response = "Yes") %>%
  pivot_longer(!response, values_to = "Yes") %>%
  mutate(name = str_replace_all(name, fixed("."), " ")) %>%
  mutate(name = case_when(name == "Serial Native Accesory Converter  SNAC " ~ "SNAC",
                          name == "mt32 pi" ~ "mt32-pi",
                          TRUE ~ name),
         No = 1 - Yes) %>%
  mutate(name = ordered(name, levels = rev(name))) %>%
  select(!response) %>%
  pivot_longer(!name, names_to = "response") %>%
  group_by(name) %>%
  mutate(pos = cumsum(value) - value / 2) %>%
  ggplot(aes(x = name, y = value, fill = response)) + 
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  labs(title = "Do you own at least one of the following?",
       fill = "") +
  coord_flip() +
  theme(legend.position = "bottom",
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank()) +
  guides(fill = guide_legend(reverse = TRUE)) +
  scale_fill_manual(values = c("#E57373",
                               "#81C784")) +
  geom_text(aes(y = pos, label = paste0(round(value * 100, 2), "%"), vjust = 0))


sum_other(dat$Please.select.any.SDRAM.module.you.have.at.least.one.of..If.you.are.unsure..select..I.don.t.know..,
          c("32MB", "64MB", "128MB", "I don't own any of these", "I don't know")) %>%
  filter(X1 != "Other") %>%
  mutate(p = X2 / sum(dat$Please.select.any.SDRAM.module.you.have.at.least.one.of..If.you.are.unsure..select..I.don.t.know.. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "SDRAM Module(s) Ownership",
       x = "Module",
       y = "Percentage of participants with at least one") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

I was a little bit surprised at just how many users have the 128MB module, especially because the combined proportion of users that either the GBA or Neo Geo core (or both) was only 83.2%.


valid <- dat %>%
  filter(Please.select.any.case.you.have.at.least.one.of..If.you.are.unsure..select..I.don.t.know.. != "") %>%
  pull(Please.select.any.case.you.have.at.least.one.of..If.you.are.unsure..select..I.don.t.know..) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(Please.select.any.case.you.have.at.least.one.of..If.you.are.unsure..select..I.don.t.know.. != "") %>%
  pull(Please.select.any.case.you.have.at.least.one.of..If.you.are.unsure..select..I.don.t.know..) %>%
  sum_other(valid) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Please.select.any.case.you.have.at.least.one.of..If.you.are.unsure..select..I.don.t.know.. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Case Ownership",
       x = "Genre",
       y = "Percentage of participants with at least one") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

I wish I had opened this up to free-response because 26.6% is a lot of people and I have a hard time believing they all just rock a naked board.


dat %>%
  filter(Have.you.purchased.a.MiSTer.build.that.came.preconfigured. != "",
         Have.you.purchased.a.MiSTer.build.that.came.preconfigured. != "I don't know") %>%
  group_by(Have.you.purchased.a.MiSTer.build.that.came.preconfigured.) %>%
  tally() %>%
  mutate(pos = cumsum(n) - n / 2) %>%
  mutate(pos = sum(n) - pos) %>%
  ggplot(aes(x = "", y = n, fill = Have.you.purchased.a.MiSTer.build.that.came.preconfigured.)) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  labs(title = "Have you purchased a MiSTer build that came preconfigured?",
       fill = "") +
  coord_flip() +
  theme(legend.position = "bottom",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank()) +
  guides(fill = guide_legend(reverse = TRUE)) +
  scale_fill_manual(values = c("#E57373",
                               "#81C784")) +
  geom_text(aes(y = pos, label = paste0(round(n / sum(n) * 100, 2), "%"), vjust = -12))

dat %>%
  filter(Have.you.purchased.a.MiSTer.build.that.came.preconfigured. != "",
         Have.you.purchased.a.MiSTer.build.that.came.preconfigured. != "I don't know") %>%
  mutate(find = case_when(How.did.you.find.this.survey. %in% c("Discord", "Facebook", "Twitter", "Reddit", "MiSTerFPGA.org") ~ How.did.you.find.this.survey.,
                          TRUE ~ "Other")) %>%
  group_by(find, Have.you.purchased.a.MiSTer.build.that.came.preconfigured.) %>%
  tally() %>%
  mutate(p = paste0(round(n * 100 / sum(n), 2), "%")) %>%
  filter(Have.you.purchased.a.MiSTer.build.that.came.preconfigured. == "Yes") %>%
  select(find, p) %>%
  kable(col.names = NULL)
Discord 21.6%
Facebook 30.97%
MiSTerFPGA.org 24.35%
Other 16.67%
Reddit 21.82%
Twitter 26.53%

I was a little bit surprised to see that so many had purchased a preconfigured build. It’s a good thing to keep in mind as more capable users interact with and help those less knowledgeable.


valid <- c("31kHz CRT (PC CRT)", "Consumer 15kHz CRT (Typical tube TV)", "LCD (Most modern computer monitors and TVs)", "OLED", "Professional 15kHz CRT (e.g. PVM/BVM)", "I don't know")

dat %>%
  filter(Please.select.any.display.type.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know.. != "") %>%
  pull(Please.select.any.display.type.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know..) %>%
  sum_other(valid) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Please.select.any.display.type.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know.. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Display Type Used",
       x = "Genre",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

Most of the “Other” responses were either plasma TVs, Arcade CRTs, or iPad screens, with a few other technologies mixed in. According to some crude string matching, just barely over half of participants use some kind of CRT.


valid <- dat %>%
  filter(Please.select.any.video.options.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know.. != "") %>%
  pull(Please.select.any.video.options.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know..) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(Please.select.any.video.options.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know.. != "") %>%
  pull(Please.select.any.video.options.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know..) %>%
  sum_other(valid) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Please.select.any.video.options.you.typically.use.with.your.MiSTer.setup..If.you.are.unsure..select..I.don.t.know.. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Video Option Usage",
       x = "Option",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

Input Devices


valid <- dat %>%
  filter(Of.the.following.controller.input.device.manufacturers..whose.devices.do.you.use.with.your.MiSTer.setup..Select.all.that.apply. != "") %>%
  pull(Of.the.following.controller.input.device.manufacturers..whose.devices.do.you.use.with.your.MiSTer.setup..Select.all.that.apply.) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(Of.the.following.controller.input.device.manufacturers..whose.devices.do.you.use.with.your.MiSTer.setup..Select.all.that.apply. != "") %>%
  pull(Of.the.following.controller.input.device.manufacturers..whose.devices.do.you.use.with.your.MiSTer.setup..Select.all.that.apply.) %>%
  sum_other(valid) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Of.the.following.controller.input.device.manufacturers..whose.devices.do.you.use.with.your.MiSTer.setup..Select.all.that.apply. != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Controller Usage by Manufacturer",
       x = "Manufacturer",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

Between MiSTer and Analogue, 8BitDo certainly has the lion’s share of the FPGA controller market. It’s interesting to see how many reported using Nintendo and SEGA products compared to how many use DaemonBite adapters. It would be interesting to know what proportion of that disparity comes from SNAC users v.s. users of the Switch Pro Controller, for example.


dat %>%
  filter(What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller. <= 100,
         What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller. >= 0) %>%
  ggplot(aes(x = What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller., fill = TRUE)) +
  geom_histogram(binwidth = 0.5) +
  theme_pander() +
  scale_fill_pander() +
  scale_x_continuous(breaks = seq(0, 100, by = 5)) +
  labs(title = "What is the maximum acceptable input lag in milliseconds for a controller?",
       x = "Input lag (ms)",
       y = "Frequency") +
  theme(legend.position = "none")

dat %>%
  filter(What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller. <= 100,
         What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller. >= 0) %>%
  group_by(What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller.) %>%
  tally() %>%
  arrange(desc(What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller.)) %>%
  mutate(p = cumsum(n) / sum(n)) %>%
  ggplot(aes(x = What.is.the.maximum.acceptable.input.lag..in.milliseconds..for.a.controller., y = p)) +
  geom_line() +
  theme_pander() +
  scale_fill_pander() +
  scale_x_continuous(breaks = seq(0, 100, by = 5)) +
  labs(title = "Acceptability of Input Lag",
       x = "Input lag (ms)",
       y = "Percentage of participants that find value acceptable") +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

This was an interesting question, though it probably could have been worded a bit better. I’m not sure all users have a good grasp of how milliseconds translate to lag. I also wasn’t sure that the distribution was very easy to make sense of, so I made the second chart to try and capture what the participant consensus would be for a controller with a given amount of lag. I did do some other analysis related to age, but found no apparent relationship.


dat %>%
  summarize(across(30:31, function(x) sum(x == "Yes") / sum(x %in% c("Yes", "No")))) %>%
  mutate(response = "Yes") %>%
  pivot_longer(!response, values_to = "Yes") %>%
  mutate(name = str_replace_all(name, fixed("."), " ")) %>%
  mutate(name = case_when(grepl("wired", name) ~ "Wired",
                          TRUE ~ "Wireless"),
         No = 1 - Yes) %>%
  
  ggplot(aes(x = name, y = Yes, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, 1)) +
  labs(title = "Connection Type Usage Rates",
       x = "Connection type",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = reorder(name, Yes), y = Yes, label = paste0(round(Yes * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

Other


logo <- c("#e4000f", "#17569b", "#B0BEC5")

valid <- dat %>%
  filter(Nintendo.or.SEGA. != "") %>%
  pull(Nintendo.or.SEGA.) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(Nintendo.or.SEGA. != "") %>%
  pull(Nintendo.or.SEGA.) %>%
  sum_other(valid) %>%
  filter(X2 > 0) %>%
  mutate(X1 = ordered(X1, levels = c("Nintendo", "SEGA", "Indifferent"))) %>%
  arrange(X1) %>%
  mutate(pos = cumsum(X2) - X2 / 2,
         colr = c("1", 2, 1),
         perc = paste0(round(X2 / sum(X2) * 100, 2), "%")) %>%
  ggplot(aes(x = "", y = X2, fill = rev(X1))) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  scale_fill_manual(values = rev(logo)) +
  labs(title = "Nintendo or SEGA?") +
  geom_text(aes(y = pos, label = perc, vjust = -12)) +
  geom_text(aes(y = pos, label = X1, angle = 45, color = colr)) +
  scale_colour_manual(values = c("#000000", "#FFFFFF")) +
  coord_flip() +
  theme(legend.position = "none",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank())


logo <- c("#e4000f", "#17569b", "#B0BEC5")

valid <- dat %>%
  filter(Which.is.your.dominant.hand. != "") %>%
  pull(Which.is.your.dominant.hand.) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(Which.is.your.dominant.hand. != "") %>%
  pull(Which.is.your.dominant.hand.) %>%
  sum_other(valid) %>%
  filter(X2 > 0) %>%
  arrange(X1) %>%
  mutate(pos = cumsum(X2) - X2 / 2,
         colr = c("1", 2, 1),
         perc = paste0(round(X2 / sum(X2) * 100, 2), "%")) %>%
  ggplot(aes(x = "", y = X2, fill = rev(X1))) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  scale_fill_pander() +
  labs(title = "Which is your dominant hand?") +
  geom_text(aes(y = pos, label = perc, vjust = -12)) +
  geom_text(aes(y = pos, label = X1, angle = 45, color = colr)) +
  scale_colour_manual(values = c("#000000", "#FFFFFF")) +
  coord_flip() +
  theme(legend.position = "none",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank())

This is roughly consistent with the general population, though the proportion of ambidexters is a fair bit above what a quick Google search says is the general proportion. It was just a silly question to ask for fun.


dat %>%
  filter(Do.you.sometimes.prefer.low.fidelity.signals..e.g..composite.RF.. != "",
         Do.you.sometimes.prefer.low.fidelity.signals..e.g..composite.RF.. != "I don't know") %>%
  group_by(Do.you.sometimes.prefer.low.fidelity.signals..e.g..composite.RF..) %>%
  tally() %>%
  mutate(pos = cumsum(n) - n / 2) %>%
  mutate(pos = sum(n) - pos) %>%
  ggplot(aes(x = "", y = n, fill = Do.you.sometimes.prefer.low.fidelity.signals..e.g..composite.RF..)) +
  geom_bar(stat = "identity", width = 0.8, lwd = 1, color = "white") +
  theme_pander() +
  labs(title = "Do you sometimes prefer low fidelity signals (e.g. composite/RF)?",
       fill = "") +
  coord_flip() +
  theme(legend.position = "bottom",
        aspect.ratio = 2 / 5,
        axis.text.x = element_blank(),
        panel.grid.major  = element_blank(),
        axis.title.y = element_blank(),
        axis.title.x = element_blank()) +
  guides(fill = guide_legend(reverse = TRUE)) +
  scale_fill_manual(values = c("#E57373",
                               "#81C784")) +
  geom_text(aes(y = pos, label = paste0(round(n / sum(n) * 100, 2), "%"), vjust = -12))


valid <- dat %>%
  filter(Core != "") %>%
  pull(Core) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(Core != "") %>%
  pull(Core) %>%
  sum_other(valid, "; ") %>%
  slice(1:(n() - 1)) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Core != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, .11)) +
  labs(title = "Which core not currently in development would you most like to see?",
       x = "Manufacturer",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

valid <- dat %>%
  filter(Feature != "") %>%
  pull(Feature) %>%
  str_split(", ") %>%
  unlist() %>%
  table() %>%
  data.frame() %>%
  filter(Freq > 1) %>%
  rename(replace = c(`type` = `.`)) %>%
  pull(replace...type) %>%
  as.character()

dat %>%
  filter(Feature != "") %>%
  pull(Feature) %>%
  sum_other(valid, "; ") %>%
  slice(1:(n() - 1)) %>%
  filter(X2 != 0) %>%
  mutate(p =  X2 / sum(dat$Feature != "")) %>%
  ggplot(aes(x = reorder(X1, p), y = p, fill = TRUE)) +
  geom_bar(stat = "identity", width = 0.8) +
  theme_pander() +
  scale_fill_pander() +
  coord_flip(ylim = c(0, .23)) +
  labs(title = "Which feature not currently in development would you most like to see?",
       x = "Manufacturer",
       y = "Percentage of participants") +
  theme(legend.position = "none") +
  geom_text(aes(x = X1, y = p, label = paste0(round(p * 100, 1), "%"), hjust= -0.2)) +
  scale_y_continuous(labels = scales::percent_format(accuracy = 1))

Please be aware that I cannot possibly know everything about every piece of hardware and categories that capture more tend to offer better insights than categories that capture less. I also did this in Google Sheets by hand, so sweeping changes are kind of difficult. Most of the “[Company] arcade” responses refer to a particular set of games that ran on similar hardware, but could technically be a bit more broad. SEGA, in particular, was hard to pin down. Exact responses to these questions can be found at the bottom so if you feel my categorization missed something, you’re welcome to perform your own analysis.

Custom Responses

Several questions allowed for the submission of custom responses. These are those responses, either randomized uniquely or tallied. They have not been filtered or cherry-picked, not even to remove joke responses. You have been warned.


How did you find this survey?

rllmuk forums
Friends
Whats’app
Circuit-board.de
CiBo.de
Shared on another forum
Psychic Disturbance in Uranus
rllmukforum.com
Retro gaming forum
Friend
sentient 6
circuit-board.de
IRC
Circuit Board Forum

Which platforms do you use to interact with the MiSTer community?

Discord, Facebook, shmups.system11.org
I read mister related news on Reddit and misterfpga.org, but I don’t interact.
Telegram
Discord, Reddit, Patreon
Twitter, Facebook, Telegram
None
Discord, Twitter, MiSTerFPGA.org, Telegram
Twitter, Telegram
Discord, Twitter, MiSTerFPGA.org, Patreon
Discord, rllmukforum.com
Discord, Twitter, github
Reddit, YouTube
MiSTerFPGA.org, YouTube
Twitter, MiSTerFPGA.org, YouTube
None
Discord, Reddit, Twitter, MiSTerFPGA.org, MiSTer Github
None
The More Nesticles that show up in the MiSTer community, the less I interact with it.
Twitter, assorted forums
MiSTerFPGA.org, ResetEra
Discord, Reddit, Twitter, Patreon
MiSTerFPGA.org, GitHub
I don’t really do
Discord, Reddit, Twitter, MiSTerFPGA.org, Patreon
Reddit, Twitter, Youtube
Facebook, Patreon
Discord, MiSTerFPGA.org, (I don’t use Discord too much – the conversation moves too fast. Forums are better.)
Reddit, 4chan
Twitter, MiSTerFPGA.org, Patreon
Discord, GitHub
Discord, Reddit, Meatspace
Discord, Twitter, Facebook, Patreon
Facebook, Friend who’s on discord
Youtube
Twitter, MiSTerFPGA.org, Unstagram
Discord, Twitter, YouTube
Circuit-board.de
word of mouth
Discord, MiSTerFPGA.org, Github, if that counts
None
Facebook, Mister Forum
Reddit, MiSTerFPGA.org, 4chan
Twitter, MiSTerFPGA.org, Patreon
Apart from the occasional tweet, I am not active in the MiSTer community.
Discord, Twitter, GitHub
Reddit, MiSTerFPGA.org, 4chan’s mister thread on the retro video game board
Discord, Twitch
Reddit, MiSTerFPGA.org, GitHub
Discord, Reddit, Twitter, Facebook, MiSTerFPGA.org, Tinder
Reddit, Atariage
Telegram
Reddit, Twitter, youtube
Twitch
Discord, Reddit, Twitter, MiSTerFPGA.org, Patreon
Discord, Twitter, MiSTerFPGA.org, ResetEra
Discord, Twitter, Facebook, MiSTerFPGA.org, Youtube
NONE
Discord, Reddit, Twitter, Youtube
Discord, MiSTerFPGA.org, GitHub
None
Facebook, Telegram
Github
Discord, Twitter, Patreon
Reddit, Twitter, MiSTerFPGA.org, Youtube
Discord, Reddit, Twitter, Facebook, MiSTerFPGA.org, YouTube
Twitter, Shacknews.com Chatty
Discord, Reddit, Twitter, MiSTerFPGA.org, Patreon
Discord, Reddit, Twitter, MiSTerFPGA.org, YouTube

What best captures your line of work/study?

Finance 11
IT 11
Education 10
Healthcare 9
Graphic Design 5
Teacher 5
Business 4
Construction 4
Design 4
Law 4
Retail 4
Electrician 3
Game Development 3
Logistics 3
Management 3
Marketing 3
Medicine 3
Other 3
- 2
Accounting 2
Agriculture 2
Architecture 2
Audio Engineering 2
Consulting 2
Customer Service 2
Customer service 2
Education 2
Engineering 2
Gaming 2
Health 2
IT Support 2
Industry 2
Information Technology 2
Mechanical engineering 2
Musician 2
Network engineering 2
Sales 2
finance 2
2D animation 1
2d/3d art 1
3D animation / Design 1
AV Technician 1
Advertising/Business 1
Aeronautique 1
Ag 1
Analysis 1
Archiving 1
Art 1
Artist 1
Attorney 1
Audiologist 1
Auto Body Owner 1
Banking 1
Biology 1
Brewing Beer 1
Broadcast Audio 1
Building trade 1
Bum 1
Bus Driver 1
Business Analysis 1
Business Analyst 1
Business Management 1
Business Owner/Tattooist 1
Business selling scientific equipment 1
CNC electrical repair technician 1
CSR 1
Caregiver 1
Carpentry 1
Catering 1
Chemistry 1
Children Education 1
Civil service 1
Commerce 1
Commercial art 1
Computer Repair troubleshooting 1
Computer programming 1
Computer support 1
Computer/Software Product Management 1
Concept Artist 1
Content Developer 1
Content Writer 1
Couch/madress tester AKA lasy ass! 1
Courier 1
Customer Service & Support 1
Customer service 1
Customer support 1
Cybersecurity 1
Cybersecurity / domain abuse 1
Day Job Network Admin / Side Job Analog Synthesizer Design 1
Degree was in Geography; career is IT. 1
Design/Media 1
Diesel mechanic 1
Distribution 1
Doctor 1
Drug Dealer (legal) 1
Electrical Engineer 1
Electrical Engineering 1
Electronic Engineering 1
Electronic sales 1
Electronics 1
Electronics Engineering 1
Engineer 1
Engineering 1
Engineering Software 1
Environmental Compliance 1
Fabrication 1
Factory worker 1
Field service technician 1
Film/TV 1
Filmmaking 1
Finance 1
Financial Advisor 1
Financial Planner 1
Fine Arts 1
Fine Arts Education 1
Fire fighting 1
Food Industry 1
Food service 1
Full-time carer 1
GARBAGE INDUSTRY 1
Game Dev 1
Game Dev technical Artist 1
Game dev 1
Game development 1
Games journalism 1
Gg 1
Goods vehicle driver 1
Government 1
HVAC 1
HVAC 1
Health care 1
Health care 1
Health products regulation 1
Healthcare fundraising 1
Helicopter crew chief 1
High Frequency Trading of derivatives 1
Home automation 1
Hospitality 1
I don’t know anymore 1
I just like tech. No formal education. 1
I put toner on paper. 1
I work in sterilization 1
IT Operations 1
IT journalist 1
IT support 1
Industrial Engineer, Music Composer/Producer, Photographer 1
Industrial engineering 1
Industrial equipment 1
Information technology 1
Instrument technician 1
Interpreting 1
Japanese Studies 1
Jobless deadbeat 1
Labouring 1
Land surveyor 1
Laser Engineer 1
Legal 1
Library Science 1
Life sciences 1
Linguistics 1
Logistics Engineering 1
Manager at a municipality. 1
Marketing SaaS 1
McDonald’s 1
Mechanic 1
Mechanical Engineering 1
Mechanical Engineering 1
Media 1
Medical 1
Medical Research 1
Mental Health 1
Mental health 1
Metaphysics 1
Military 1
Movies 1
Multimedia Technology 1
Music 1
Music business 1
Music composer 1
Music industry 1
Music producer. 1
Music production 1
Musician, Dental Lab Technician, Metal Fabricator 1
N/A 1
NEET 1
Network and Telecoms 1
Network engineering 1
Nightvision 1
None, I just work. 1
Nothing I am an idiot 1
Noyb 1
Nuclear physicist 1
Nursing 1
Occupational health and safety 1
Off shore underwater basket weaving 1
Online media/podcasts/video 1
Operating System Development 1
Operations 1
PR 1
Paralegal 1
Pastor 1
Photo Development 1
Pilot 1
Plumbing 1
Post Production Engineer 1
Product Design 1
Product Development 1
Product Management 1
Product Support (Property Management Software) 1
Professional services 1
Professor and Filmmaker 1
Psychology 1
Publishing 1
Quality Assurance 1
Real Estate 1
Recording Engineer 1
Rehabilitation 1
Research 1
Retail 1
Retail marketing 1
Retail/Grocery 1
Retired 1
Retro gaming 1
Sales manager 1
Security 1
Service Engineer 1
Service Quality Assurance 1
Sex worker 1
Social Sciences 1
Social science 1
Social work 1
Social worker 1
Software Development 1
Software engineer 1
Software product management 1
Softwarr Developer 1
Stock Market 1
Structural engineering 1
Supply Chain 1
TV/Film 1
Tech Support 1
Tech/PC journalist 1
Technical support 1
Telecommunications 1
Test Manager 1
Theater 1
Transport 1
Truck/big rig driving 1
UI Design 1
Unemployed 1
VR/MR/AR programming, graphics and audio 1
Video Production / Postproduction 1
Video creator 1
Video game QA 1
Video games 1
Videogames 1
Videography 1
Visual Effects 1
Warehouse 1
Warehouse Manager 1
Web Admin/Data Entry/Retail/Tech Support 1
Web Development 1
Web developer 1
Writer 1
Writing 1
aerospace 1
are arts humanities 1
carpentry 1
contract commercial services 1
dirtbag 1
driver 1
education - computer networking 1
electrical engineer 1
entertainment 1
farmer 1
game developmenr 1
high school 1
journalism 1
landscape 1
law 1
legal 1
marcomm 1
maths 1
network engineer 1
none 1
office based 1
retired 1
rocket sience 1
sea rescue equipment maintenance 1
service repair 1
studied physics, work computer science 1
tabletop game design 1
technology 1
telecommunications engineering 1
vat 1
video game dev 1
video games 1
web design/development, which kinda has a toe most of these answers to some capacity 1

To which gender identity do you most identify?

Attack Helicopter 1
Fuck kind of bullshit options is “gender variant”?! 1
Gender is nonsense. Ask me what sex I am. 1
Mandroid 1
Meat Popsicle 1
The middle right zit on Trumps left ass check! 1
There is only m/f and prefer not to say. 1
Transgender 1
Unsure 1

During the commercial lifespan of these platforms, which genres did you tend to play at home?

Tactical RPG
Platform, Adventure, Shoot ’em up, Beat ’em up, Puzzle, Racing, Fighting, CRPG (Western RPG), Simulation, Lightgun, pinball
I wasn’t born when the systems were commercially available
Platform, Adventure, Shoot ’em up, Puzzle, Racing, Fighting, Rhythm, CRPG (Western RPG), Simulation, Strategy, Sports, Lightgun, Custard’s Last Stand, Stroke’Em 64, MacPlaymates
Platform, Adventure, Shoot ’em up, Puzzle, Racing, JRPG, Simulation, Strategy, Party
Adventure, Racing, CRPG (Western RPG), JRPG, Sports, Action
Adventure, CRPG (Western RPG), Dating Simulators
Shoot ’em up, Pacman
Platform, Shoot ’em up, Racing, Simulation, Strategy, Space Sim (aka Wing Commander)

During the commercial lifespan of these platforms, which genres did you tend to play in the arcade?

Beat ’em up, Shoot ’em up, Fighting, Puzzle, Racing, Lightgun, Pinball, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), Literally any weird machine got fed quarters
N/A
Never been to an arcade
Did not have any arcades around
No arcades for minors in Germany :(
Beat ’em up, Racing, Pinball, Platform
Beat ’em up, Shoot ’em up, Fighting, Racing, Lightgun, Pinball, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), Deluxe sit down arcades
Beat ’em up, Shoot ’em up, Racing, Lightgun, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), Sports
I wasn’t allowed to go to arcades as a kid because the people there were dangerous but I fell in love with Magician Lord on the Neo Geo
Did not frequent arcades
Beat ’em up, Shoot ’em up, Fighting, Racing, Lightgun, Action Platformers (like Ghosts n Goblins, Black Tiger, etc.)
From Germany, there were no Arcades for people under 18 years.
Shoot ’em up, Fighting, Puzzle, Racing, Lightgun, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), Transcendental Trantic Psychedelic Turbo-poop Head Trips
Beat ’em up, Shoot ’em up, Fighting, Puzzle, Racing, Lightgun, Pinball, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), VR Simulations (Virtuality 1000, 2000, etc..)
Beat ’em up, Shoot ’em up, Fighting, Pinball, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), Shmups
Shoot ’em up, Puzzle, Lightgun, Pinball, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), Adventure games (e.g., Segasonic The Hedgehog, Space Ace/Dragon’s Lair)
Racing, Arcade classics (e.g. Pac-Man, Centipede, Dig Dug), Sports
I wasn’t born at that time
Fighting, Racing, Action platform

Please select any display type you typically use with your MiSTer setup

Arcade crt monitor
LCD (Most modern computer monitors and TVs), OLED, Professional 15kHz CRT (e.g. PVM/BVM), 31kHz CRT (PC CRT), iPad 3 screen
LCD (Most modern computer monitors and TVs), OLED, Consumer 15kHz CRT (Typical tube TV), Commodore 2002 monitor
OLED, Professional 15kHz CRT (e.g. PVM/BVM), JVC DTV17-19
LCD (Most modern computer monitors and TVs), Projector
Plasma
ex IPAD display
LCD (Most modern computer monitors and TVs), Consumer 15kHz CRT (Typical tube TV), Arcade cab monitor
Plasma
Professional 15kHz CRT (e.g. PVM/BVM), Arcade cabinet
LCD (Most modern computer monitors and TVs), iPad 3 monitor
LCD (Most modern computer monitors and TVs), Arcade 15khz CRT
31kHz CRT (PC CRT), Arcade CRT
LCD (Most modern computer monitors and TVs), Professional 15kHz CRT (e.g. PVM/BVM), Arcade 15kHz CRT (Nanao MS8-29FSG)
I don’t know
Consumer 15kHz CRT (Typical tube TV), Professional 15kHz CRT (e.g. PVM/BVM), 31kHz CRT (PC CRT), Arcade monitor
LCD (Most modern computer monitors and TVs), Professional 15kHz CRT (e.g. PVM/BVM), 15 khz true multifrequency/multiscan Sony CPD-1302 RGB/VGA CRT.
LCD (Most modern computer monitors and TVs), OLED, Consumer 15kHz CRT (Typical tube TV), Professional 15kHz CRT (e.g. PVM/BVM), 31kHz CRT (PC CRT), Front- and rear-projection displays, e-paper displays, monochrome LCDs, vector displays
Professional 15kHz CRT (e.g. PVM/BVM), Sega New Astro City
LCD (Most modern computer monitors and TVs), OLED, Couldn’t select 15 khz consumer
LCD (Most modern computer monitors and TVs), Consumer 15kHz CRT (Typical tube TV), Ipad 3 screen repurposed
LCD (Most modern computer monitors and TVs), Projector
LCD (Most modern computer monitors and TVs), HD CRT
Plasma TV (will be replaced by OLED TV sooner or later)
Plasma
LCD (Most modern computer monitors and TVs), MVS-U4 CRT
27" Tri-sync arcade CRT (15, 25, 31 kHz)
Consumer 15kHz CRT (Typical tube TV), Arcade monitor
LCD (Most modern computer monitors and TVs), OLED, Consumer 15kHz CRT (Typical tube TV), 31kHz CRT (PC CRT), 15Khz CRT monitor (1084 and similar)
Consumer 15kHz CRT (Typical tube TV), arcade monitor 31khz
LCD (Most modern computer monitors and TVs), Multisync CRT
LCD (Most modern computer monitors and TVs), Professional 15kHz CRT (e.g. PVM/BVM), DLP Projector
HD Plasma TV
Professional 15kHz CRT (e.g. PVM/BVM), 31kHz CRT (PC CRT), Plasma
OLED, Consumer 15kHz CRT (Typical tube TV), Capture card
Professional 15kHz CRT (e.g. PVM/BVM), UST Laser Projector
Professional 15kHz CRT (e.g. PVM/BVM), Plasma
LCD (Most modern computer monitors and TVs), 9.7” iPad screen and driver
Consumer 15kHz CRT (Typical tube TV), Arcade cabinet CRT
Plasma Panasonic
LCD (Most modern computer monitors and TVs), OLED, Consumer 15kHz CRT (Typical tube TV), QLED
LCD (Most modern computer monitors and TVs), Consumer 15kHz CRT (Typical tube TV), Arcade Monitor 15kHz
1080p LCD monitor
Consumer 15kHz CRT (Typical tube TV), Professional 15kHz CRT (e.g. PVM/BVM), Arcade monitors
Consumer 15kHz CRT (Typical tube TV), Plasma HDTV
I don’t know
Consumer 15kHz CRT (Typical tube TV), Plasma
Plasma TV 1080p
LCD (Most modern computer monitors and TVs), LED
LCD (Most modern computer monitors and TVs), Dell 15kHz LCD
LCD (Most modern computer monitors and TVs), 31kHz CRT (PC CRT), Multisync arcade CRT monitor
LCD (Most modern computer monitors and TVs), 55" plasma TV
LCD (Most modern computer monitors and TVs), OLED, DLP Projector
Consumer 15kHz CRT (Typical tube TV), 65” 1080p Plasma
OLED, Arcade monitors - Nanao MS-9/Tosh tube
Plasma RV
OLED, Commodore 1084S
Consumer 15kHz CRT (Typical tube TV), Plas
LCD (Most modern computer monitors and TVs), plasma
OLED, Professional 15kHz CRT (e.g. PVM/BVM), Digital Projector
None
OLED, Professional 15kHz CRT (e.g. PVM/BVM), Ipad

What core not currently in development would you most like to see?

find_first <- function(string, vec) {
  for (i in vec) {
    if(str_detect(string, i)) {
      return(which(vec == i))
    }
  }
  return(0)
}

vec <- unlist(str_split(dat$Core, "; "))
vec <- vec[vec != ""]
sorted <- sort(table(vec), decreasing = TRUE)

dat %>%
  mutate(level = sapply(Core, function(x) find_first(x, names(sorted)))) %>%
  filter(What.core.not.currently.in.development.would.you.most.like.to.see. != "") %>%
  sample_n(nrow(.)) %>%
  arrange(level) %>%
  select(What.core.not.currently.in.development.would.you.most.like.to.see., Core) %>%
  kable(col.names = NULL)
n/a
Honestly I think everything I want exists or is on the way.
Difficult question— I think at this point everything I want is either here or in development in terms of cores.
Don’t know
Not sure, they’re working on PlayStation right?
The only remaining cores I want are already in development: PSX, Saturn, Konami, Sega System16
Don’t know
I can’t think of one
Can’t think of one
None
n/a
N/A
indifferent
Intelevision was not listed. I use the one that exists
They’re are/were all in development :)
unsure what is in development since I dont really follow or upgrade it it now its working.
No answer
Unsure. I think everything I want is being worked on.
None
Idk, you make so much I’m still sorting through.
Na
Everything I want is at least in development
everything I want in covered
NARC Arcade game
Naomi Arcade game
Rainbow Islands (arcade) Arcade game
namco system 11 Arcade game
Honestly i would love if all the focus went just to arcade cores, since in my humble oppinion it is the most underrated and the one most lacking in availability. Arcade game
Crime City Arcade Game Arcade game
Arcade Arcade game
Namco System 86 Arcade game
Any Arcade Games Arcade game
Mostly arcade stuff: Cinematronics vector games, Atari color vector, Atari System 1 and 2 Arcade game
Darius Arcade game
Marble Madness Arcade game
Mr Do’s Castle Arcade game
Namco arcade Systems Arcade game
cave Arcade game
More arcades Arcade game
Cave shooters Arcade game
Some specific arcade games - rainbow islands first Arcade game
Hyper Sports / Track and Field Arcade game
Quantum, the arcade game Arcade game
Namco System 11/12 Arcade game
More arcade, playstation, and Saturn, although I don’t know if the de10 nano has enough gates Arcade game
Taito Z System (Space Gun, Night Striker). Arcade game
More arcade cores Arcade game
Astro invaders (arcade) Arcade game
Rolling Thunder Arcade game
TNZS arcade Arcade game
Caveman ninja Arcade game
Track and Field Arcade game
More arcade cores Arcade game
Battletoads Arcade game
Atari System 1 and 2 Arcade game
More arcade cores Arcade game
missile command Arcade game
More arcade cores. Cave especially Arcade game
Cave SH3 Arcade game
Any classic Arcade cores Arcade game
just more arcade cores full stop. The console side is pretty much complete for me I guess I can’t think of anything on hand Arcade game
Taito Arcade, System16/18 System2 System 16; System 18; Arcade game
Raizing Arcade game
NGPC and several arcade cores NGPC; Arcade game
Astro blaster and other classic arcade like starship one Arcade game
Arcade: The Fairyland Story Arcade game
Wonder boy in monster land Arcade game
More Arcade Cores, Virtual Boy, NeoGeo Pocket/Color, FM Towns Marty Arcade game; Virtual Boy; NGPC; FM Towns
Anything Arcade mid to late 90s Arcade game
(With the caveat that some are obviously in development) more Arcade cores from big developers like Sega and Konami. SEGA arcade; Konami arcade; Arcade game
Cave sh3 Arcade game
Stun Runner Arcade game
More arcade cores (Vigilante, Konami (TMNT, Crime Fighters…), Bad Dudes, Robocop … Arcade game; Konami arcade
Crystal Castles Arcade game
Raiden Arcade game
More of the z80 based arcade machines Arcade game
Cave Arcade game
Apple IIgs, Laserdisks like Dragons Lair Apple IIGS; Arcade game
Kaneko Air Buster Arcade Arcade game
Wonder Boy in Monster Land Arcade Arcade game
classic arcade games Arcade game
Namco System 1 Arcade game
Swag Arcade (afterburner) Arcade game
more arcade SHMUPs please Arcade game
Cave CV1000 Arcade game
Several arcade classic games. Arcade game
Various Arcade Cores Arcade game
arcades Arcade game
Data East arcade Arcade game
Sega, taito, konami, Capcom, or irem arcade cores SEGA arcade; Konami arcade; Irem; Arcade game
32X and lot of arcades 32X; Arcade game
More classic arcade cores and official release of Intellivision core. Arcade game; Intellivision
Data East - Night Slashers Arcade game
cinematronics vector Arcade game
Jungle King arcade Arcade game
More Arcades Arcade game
Marble Madness Arcade (and other Arcade games from the same plattform) Arcade game
X68000, 32X, PC-98, FM Towns and arcades Improve existing core; 32X; PC-9800; FM Towns; Arcade game
X68000, more arcade cores Improve existing core; Arcade game
Space Firebird by Nintendo Official paddle/ for ARCADE Arcade game
Arcade cores (systen 16, konami…) System 16; Konami arcade; Arcade game
More 1990+ arcades Arcade game
68k based Arcades: robocop, toki Arcade game
Seibu Kaihatsu Raiden (1,2,DX) and Seibu SP-1 (Raiden Fighters series and Vipe Phase1) Arcade game
NeXTcube (And Space Panic arcade..) NeXTcube; Arcade game
any arcade Arcade game
3DO, more 90’s Arcade cores (pit fighter, Gladiator,etc…) 3DO; Arcade game
LaserDisc games Arcade game
Newer arcade frameworks Arcade game
Any arcade cores. Konami, Irem, Taito, Dataeast. Konami arcade; Irem; Arcade game
Midway arcade titles from 90s (MK1/2/3, NBA Jam), Konami beat-em-up arcade titles from 90s (Simpsons, X-Men), CPS3, 90s Namco arcade games, light fun arcade games Midway arcade; Konami arcade; CPS-3; Arcade game
Arcade - Heavy Barrel Arcade game
New Arcade games Arcade game
Arcade - wrestlefest Arcade game
Laserdisc Arcade Arcade game
Arcade boards (any / all) Arcade game
Rastan Arcade game
More Arcade cores, Konami and scrolling shooters. Konami arcade; Arcade game
Midway arcade titles from 90s (MK1/2/3, NBA Jam), Konami beat-em-up arcade titles from 90s (Simpsons, X-Men), CPS3, 90s Namco arcade games, light fun arcade games Midway arcade; Konami arcade; CPS-3; Arcade game
Track and Field arcade Arcade game
Toaplan v2, cav sh2, konami hardware, arcade hardware in general Toaplan arcade; Konami arcade; Arcade game
Salamander (arcade) Arcade game
N64, Dreamcast, ps1 N64; Dreamcast; PSX
Nintendo 64 N64
Nintendo 64 N64
N64 N64
Nintendo 64 N64
N64 N64
N64 N64
N64 N64
N64 N64
Nintendo 64 N64
N64 N64
N64 N64
Nintendo 64 N64
N64 N64
N64 N64
N64 N64
Nintendo 64 N64
N64 N64
N64 N64
Sega Saturn and N64 Saturn; N64
N64 N64
N64 and my life will be complete N64
N64, if feasible. N64
Nintendo 64 N64
N64, PS1 N64; PSX
N64 N64
N64 N64
N64 N64
N64 N64
N64? Is it in development? N64
N64 N64
N64 N64
N64 N64
N64 N64
N64 N64
N64 N64
N64, though I understand that’s a big ask N64
Virtual Boy, Pokemon Mini, N64, NeoGeo CD Virtual Boy; Pokemon Mini; N64; NGCD
N64 N64
N64 N64
Nintendo 64 N64
N64 N64
N64 (perfect world) N64
N64 (wishful thinking I know) N64
Nintendo 64 N64
N64 N64
32X/N64/Hyper Neo-Geo64 32X; N64; Hyper Neo Geo 64
Nintendo 64 / Sega Saturn N64; Saturn
N64 N64
N64 N64
N74 N64
N64 N64
N64 lol N64
N64 N64
Nintendo 64 (not possible) N64
N64 N64
N64 (but not going to happen) N64
Nintendo 64 N64
N64 N64
Assuming PS1 and Saturn are in development, N64 would be my holy grail. N64
Ps1, N64 PSX; N64
N64 N64
N64 N64
N64 N64
N64 N64
N64 N64
N64 N64
Nintendo 64 N64
Nintendo 64 N64
Ps1 / n64 PSX; N64
N64 N64
N64, gamecube N64; GameCube
N64 N64
32x, 64dd, virtual boy, 3do, jaguar, ps1, n64, saturn, neo geo pocket, wonderswan 32X; 64DD; Virtual Boy; 3DO; Jaguar; PSX; N64; Saturn; NGPC; WonderSwan
Nintendo 64 and Nintendo GameCube N64; GameCube
N64 N64
N64, PSX, Saturn N64; PSX; Saturn
Pgm, pgm2, irem, jaguar, n64 PGM; PGM2; Jaguar; Irem; N64
N64 N64
N64 ;) N64
Psx, Saturn, N64 PSX; Saturn; N64
N64 N64
N64 Saturn Playstion N64; Saturn; PSX
n64 N64
Nintendo 64 N64
N64 N64
I don’t think N64 is possible, but it would be impressive. There’s so much already covered. N64
Realistically more arcades: MK, TMNT…
Dreaming: PSX, Saturn and N64 Midway arcade; Konami arcade; PSX; Saturn; N64
Nintendo 64 N64
N64 N64
N64 N64
Nintendo 64 N64
Unsure. N64 would be nice, but maybe too complex for the DE-10? N64
N64 N64
Nintendo 64 N64
n64 dreamcast ps1 N64; Dreamcast; PSX
Nintendo 64 N64
N64 N64
N64 N64
Konami arcade Konami arcade
Konami Arcade - I know Furrtek just started on the main board, but I don’t think he is actively working on the core Konami arcade
CPS3, Konami, Time Traveller, G-loc/After Burner CPS-3; Konami arcade; SEGA arcade
Konami Arcade Konami arcade
Simpsons TMNT Konami arcade
cpsiii , atari jaguar, konami arcade pcbs, mortal kombat’ssa CPS-3; Jaguar; Konami arcade; Midway arcade
Simpsons arcade Konami arcade
Konami - Simpsons Konami arcade
Arcade Simpsons Konami arcade
TMNT arcade Konami arcade
Konami beat em up arcade Konami arcade
Konami Konami arcade
Konami Fighters (TMNT Arcade / Simpsons / Xmen) Konami arcade
Konami Konami arcade
Konami arcade, midway Mk 1, 2, 3. CPS3 Konami arcade; Midway arcade; CPS-3
Konami Konami arcade
Konami Konami arcade
Mortal Kombat and TMNT Midway arcade; Konami arcade
Konami arcade gamea Konami arcade
Sunset Riders Konami arcade
Konami arcade Konami arcade
Any arcade Konami titles Konami arcade
Konami arcade Konami arcade
konami arcade Konami arcade
Konami arcade Konami arcade
Konami Arcade beat em ups Konami arcade
Konami and Naomi Konami arcade; SEGA arcade
Konami TMNT Konami arcade
Konami TMNT arcade machine Konami arcade
Konami Arcade Cores Konami arcade
System16 + Konami System 16; Konami arcade
Nintendo DS, Saturn, Play Station, Some Konami cores like TMNT and The Simpsons. NDS; Saturn; PSX; Konami arcade
X-Men Arcade or Simpsons or pretty much any Konami beat em up from that era Konami arcade
Arcade: Konami Sunset Riders Konami arcade
Konami Konami arcade
TMNT Konami arcade
Konami X-MEN / TMNT based arcade Konami arcade
Konami Arcade Konami arcade
Konami brawlers like tmnt arcade Konami arcade
TMNT arcade Konami arcade
Gradius (Arcade) , Wonderswan (System) Konami arcade; WonderSwan
TMNT Arcade Konami arcade
simpsons arcade Konami arcade
Konami arcade Konami arcade
Konami arcade core(s) Konami arcade
konami arcade boards like tmnt and wild guns Konami arcade
Konami arcade (tmnt, x-men) Konami arcade
Konami GX Konami arcade
Konami Konami arcade
TMNT/Sunset Riders Konami arcade
Teenage Mutant Ninja Turtles Konami arcade
Run and Gun Konami arcade
TMNT or Simpsons Arcade Konami arcade
Konami ie: Simpsons, tmnt Konami arcade
TMNT Konami arcade
Konami TMNT Konami arcade
Konami arcade (TMNT, Simpsons, X-Men, etc) Konami arcade
tmnt.cpp Konami arcade
CPS3, Konami,Taito F3 CPS-3; Konami arcade; Taito F3
Konami arcade Konami arcade
Konami TMNT Konami arcade
Konami (TMNT/Simpsons) Konami arcade
Mid-90s arcade (TMNT Turtles in Time, Mortal Kombat, etc) and up. Midway arcade; Konami arcade
Tmnt arcade Konami arcade
Konami arcade Konami arcade
Konami Arcade Stuff Konami arcade
whatever the tmnt arcade board is and PS1 Konami arcade; PSX
Konami Arcade Games Konami arcade
Konami Konami arcade
Early to mid 90s Konami (Tmnt TiT, Violent Storm, X-men, etc), NeoGeo Pocket Konami arcade; NGPC
Sunset Riders Konami arcade
Konami arcade Konami arcade
Konami Arcade Konami arcade
System 573/Bemani Konami arcade
Arcade Turtles in Time Konami arcade
Konami Arcade Boards (Turtles, Track & Field, Sunset Riders) Konami arcade
Playstation 1 PSX
PlayStation PSX
PSX PSX
PSX PSX
Play 1 PSX
SEGA SATURN, PSX Saturn; PSX
playstation PSX
Saturn, Jaguar, PSX, Dreamcast Saturn; Jaguar; PSX; Dreamcast
Ps1 PSX
ps1 PSX
PS1 PSX
PlayStation PSX
Psx PSX
Ps1 PSX
Ps1 PSX
PS1 PSX
playstation PSX
Playstation PSX
PSX PSX
Ps1 or Saturn PSX; Saturn
PlayStation (psx) PSX
psx PSX
Sony Playstation PSX
Psx, saturn PSX; Saturn
Playstation PSX
PlayStation 1, Sega Saturn/STV PSX; Saturn
ps1 PSX
Playstation PSX
Looking fowarrd to Saturn/PSX - but those are in dev. Saturn; PSX
ps1 PSX
Hoping for Saturn and PSX Saturn; PSX
PS1 PSX
Psx PSX
PlayStation PSX
Ps1 PSX
Playstation 1 PSX
PS1 PSX
Ps1 PSX
3DO , Playstation , 486DX , 3DO; PSX; 486DX
PSX PSX
PSX PSX
Saturn or Playstation, not sure which ones are/are not in development. Saturn; PSX
Playstation PSX
PSX PSX
PSone PSX
PS1 (since Laxer left the project) PSX
Psx PSX
Playstation PSX
playstation 1 PSX
saturn, psx Saturn; PSX
PlayStation PSX
PSX PSX
playstation1 PSX
Psx PSX
Playstation, Irem(Hook) PSX; Irem
PS1 PSX
Psx or jaguar PSX; Jaguar
Psx PSX
Playstation PSX
PSX PSX
PS1 PSX
Well that PSX drama that just happened might make the PS qualify PSX
PS1 PSX
Playstation 1 PSX
PlayStation PSX
PS1 PSX
PS1 PSX
PlayStation PSX
Mortal kombat 2 arcade core and PSX core Midway arcade; PSX
Psx PSX
PSX PSX
Playstation PSX
Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Sega Saturn Saturn
saturn Saturn
Sega Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Saturn Saturn
3do, saturn, fm-towns 3DO; Saturn; FM Towns
Saturn Saturn
Sega Saturn Saturn
saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Sega Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Saturn Saturn
Sega saturn Saturn
SEGA Saturn Saturn
SEGA Saturn Saturn
Sega Saturn Saturn
SEGA Saturn, if possible Saturn
Sega Saturn Saturn
Saturn Saturn
Saturn Saturn
Saturn Saturn
Saturn Saturn
Sega 32X, Sega Saturn, Sharp X68000, FM Towns Marty 32X; Saturn; X68000; FM Towns
Sega Saturn Saturn
Sega Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
saturn / stv / pgm Saturn; SEGA arcade; PGM
Sega Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Sega saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Saturn Saturn
Sega Saturn Saturn
Cps3 CPS-3
CPS-3 CPS-3
CPSIII CPS-3
CPS2 and CPS3 if possible. CPS-2; CPS-3
CPS3 CPS-3
Cps3 CPS-3
CPS3 CPS-3
CPS 3 CPS-3
Neogeo Pocket/32x/CPS3 NGPC; 32X; CPS-3
CPS3 CPS-3
CPS3 CPS-3
CPS 3 CPS-3
CPS-3 CPS-3
Cps3 CPS-3
CPS3 CPS-3
CPS iii CPS-3
CPS3 CPS-3
CPS3 CPS-3
CPS III CPS-3
CPS3 and Konami CPS-3
Cps3 CPS-3
Cps III CPS-3
Cps3 CPS-3
cps3 CPS-3
CPS3 CPS-3
CPS 3 CPS-3
CPS3, ZN2, Tetris the Grandmaster 2 CPS-3; ZN-2; Psikyo SH2
CPS3 or Neo Geo Pocket CPS-3; NGPC
CPS-3 CPS-3
CPS3 CPS-3
CPS-3 CPS-3
CPS3 CPS-3
CPS-III CPS-3
Cps3, sega arcade CPS-3; SEGA arcade
CPS3 CPS-3
cps3,pgm,mk2 CPS-3; PGM; Midway arcade
CPS3 CPS-3
CPS3 CPS-3
CPS3, IGS PGM CPS-3; PGM
cps3, other CAVE cores CPS-3; Other
CPS3, PGM CPS-3; PGM
Cps 3 CPS-3
CPS3 CPS-3
CPS3 CPS-3
Cps3 CPS-3
Cps3 CPS-3
CPS3 CPS-3
Either a CPS3 or SNES with Save States core (for speedrun practice) CPS-3; Improve existing core
CPS 3 CPS-3
CPS3 CPS-3
CPS3 CPS-3
CPS3 CPS-3
CPS3 CPS-3
CPS3 CPS-3
Williams Y Unit Midway arcade
Midway T Unit Midway arcade
Mortal Kombat Midway arcade
NBA jam Midway arcade
MK1 and 2 Midway arcade
Mortal Kombat Midway arcade
Killer instinct if possible Midway arcade
Ultimate MK3 Midway arcade
Midway T (Mortal Kombat/II), Midi Synth Cores (niche) Midway arcade
Midway pcbs. Ex: MK1, MK2 Midway arcade
Mortal Kombat Arcade Midway arcade
Mortal Kombat 2 Arcade Midway arcade
Midway Arcade Board Midway arcade
Mortal Kombat or Sega Model 1 Midway arcade; SEGA arcade
Midway T Unit (NBA Jam/Mortal Kombat) Midway arcade
Midway (MK, MKII, NBA Jam, Smash TV, era) Midway arcade
MK arcade Midway arcade
Mortal Kombat series Midway arcade
Mortal Kombat Arcade Midway arcade
Mortal Kombat Midway arcade
Mortal Kombat Midway arcade
Arcade Midway Midway arcade
Midway T Unit Midway arcade
Killer Instinct Arcade Midway arcade
Mortal Kombat Midway arcade
Killer Instinct arcade (MIPS) Midway arcade
mortal kombat Midway arcade
Mortal Kombat arcade Midway arcade
Dedicated Killer Instinct 1 & 2 arcade Midway arcade
Midway 90s Arcade Midway arcade
Mortal Kombat arcade Midway arcade
killer instinct Midway arcade
Midway Unit Arcade Midway arcade
Midway T Unit, 3DO Midway arcade; 3DO
Midway Killer Instinct Midway arcade
Killer instinct Midway arcade
Mortal Kombat series Midway arcade
Mortal Kombat Midway arcade
Midway T Unit Midway arcade
Mortal Kombat arcade core Midway arcade
Midway t-unit & wolf unit Midway arcade
arcade nba jam, mortal kombat Midway arcade
Killer Instinct Midway arcade
MK Midway arcade
NBA jam. Mortal Kombat Midway arcade
neo geo pocker color, some arcade cores (gaelco world rally1 &2, snow bross, pang, mortal kombat, go go mile smile, r-type, asterix , darius gaiden, thunder heroes, undercover cops, violent storm, bubble booble 2&3 NGPC; Toaplan arcade; Midway arcade; Irem
NBA Jam/Mortal Kombat Midway arcade
Midway Midway arcade
Midway arcade Midway arcade
Neo Geo Pocket (Color) NGPC
Neo Geo pocket color NGPC
neogeo pocket NGPC
Neo geo pocket NGPC
neo geo pocket, macintosh related NGPC; Other
Neo Geo Pocket NGPC
neo geo pocket NGPC
Neo Geo Pocket (+ Color) NGPC
Neo Geo Pocket NGPC
Neo pocket NGPC
Neo-Geo Pocket NGPC
Neo Geo Pocket Color NGPC
Pc98, dc, ngc, ps2 PC-9800; Dreamcast; NGPC; PS2
Neo Geo Pocket or Philip’s CD-i NGPC; CD-i
Neo Geo Pocket NGPC
Neo geo pocket NGPC
Neo Geo Pocket Color NGPC
Neo Geo Pocket Color NGPC
Neo Geo Pocket Color NGPC
NEO-GEO Pocket Color NGPC
NEO geo Pocket Color I wanted one as a kid NGPC
Neogeo pocket NGPC
Neo Geo Pocket NGPC
Neo Geo Pocket or Irem M-92 NGPC; Irem
Neo Geo Pocket Color NGPC
Neo Geo Pocket Color NGPC
Neo-Geo Pocket NGPC
Neo Geo Pocket Color NGPC
Neo Geo Pocket NGPC
Neo Geo Pocket Color NGPC
Neo-Geo Pocket Color NGPC
Neo Geo Pocket/Color NGPC
NeoGeo Pocket/Color NGPC
Neo Geo Pocket NGPC
Neo Geo Pocket Color NGPC
Neo geo pocket color NGPC
Neo Geo Pocket, Sega System 16 NGPC; System 16
Neogeo pocket NGPC
Neo Geo Pocket Color NGPC
Neo Geo Pocket Color NGPC
Neogeo pocket NGPC
NGPC NGPC
Neo Geo Pocket NGPC
Ngpc NGPC
NeoGeo Pocket Color NGPC
Neogeo Pocket Color NGPC
Neo Geo Color Pocket NGPC
Neo Geo Pocket Color NGPC
Neo geo pocket NGPC
Neo Geo Pocket Color NGPC
NeoGeo Pocket Color NGPC
3DO 3DO
3DO 3DO
3D0 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3do 3DO
CDI/3DO CD-i; 3DO
3DO or Jaguar 3DO; Jaguar
3D0 3DO
3DO 3DO
3DO 3DO
3do 3DO
3DO 3DO
3DO 3DO
If it could be done, 3DO. 3DO
3do, NEC PC FX 3DO; PC-FX
3DO 3DO
3do 3DO
3do 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
3DO 3DO
Sega superacaler? SEGA arcade
Outrun arcade SEGA arcade
Sega arcade (outrun, golden axe, space harrier, top gun, etc.) SEGA arcade
Carnival (Arcade- Sega) SEGA arcade
Sega Model 1/2, Apple Newton, Palm68k, Pentium-MMX, Virtual Boy SEGA arcade; Apple Newton; Motorola 68000; Other; Virtual Boy
Sega Super Scaler/Outrun SEGA arcade
Dreamcast / Naomi / Atomiswave Dreamcast; SEGA arcade
Sega super scalers (Outrun, After Burner, etc.) SEGA arcade
Naomi SEGA arcade
Outrun SEGA arcade
More Sega System series arcade boards (18, 24, 32, X, Y) SEGA arcade
Super Scaler SEGA arcade
I think everything I am interested in is being developed for. Sega ST-V? Model 3? SEGA arcade
Outrun SEGA arcade
Sega X Board (arcade) SEGA arcade
Sega Arcade System (Fantasy Zone, Space Harrier etc.) SEGA arcade
Outrun SEGA arcade
Sega Model 1 SEGA arcade
Out run, after burner SEGA arcade
Outrun arcade SEGA arcade
32X, Model 1 32X; SEGA arcade
Sega Model 1 SEGA arcade
Outrun arcade SEGA arcade
Hang On SEGA arcade
Outrun SEGA arcade
SEGA Saturn SEGA arcade
More Sega arcade boards SEGA arcade
Sega model 2 for remplacement in my original Racing cab SEGA arcade
Naomi or ST-V SEGA arcade
32x 32X
32X 32X
32x 32X
Sega 32x 32X
32x 32X
32x 32X
Sega 32X 32X
Jaguar or 32x Jaguar; 32X
32X 32X
32X 32X
32x 32X
Sega 32X 32X
32x - NGPC - 3DO - other 3rd and 4th gen consoles 32X
32X 32X
32x 32X
X32 32X
32x 32X
32x 32X
32x 32X
Sega 32x 32X
Sega 32x / Neo Geo CD 32X; NGCD
Sega 32X 32X
Sega 32X 32X
Sets 32x 32X
32x 32X
Sega 32X 32X
32x 32X
32x 32X
jaguar Jaguar
Atari Jaguar Jaguar
Atari Jaguar Jaguar
Jaguar Jaguar
Jaguar Jaguar
Jaguar Jaguar
Atari Jaguar Jaguar
Jaguar Jaguar
Jaguar Jaguar
Jaguar Jaguar
Jaguar Jaguar
Jaguar CD Jaguar CD
Atari Jaguar Jaguar
Jaguar Jaguar
Atari Jaguar Jaguar
atari jaguar Jaguar
Atari Jaguar Jaguar
Atari jaguar Jaguar
Atari jaguar Jaguar
jaguar Jaguar
Jaguar Jaguar
Atari jaguar Jaguar
Atari Jaguar Jaguar
Jaguar Jaguar
Atari Jaguar Jaguar
Irem M72 Irem
Rtype Irem
R-Type Arcade Irem
IREM M72 Irem
Irem M72 and M92 plus Taito F3 Irem; Taito F3
Irem M72 Irem
Irem M-92 Irem
Irem M72 (R-Type etc) Irem
Irem M-92 Irem
irem m92 Irem
Irem m72-m92 Irem
Irem m72 etc Irem
Irem M72 Irem
R Type Irem
Irem m92 Irem
Irem M72 Irem
IREM M92 Irem
Irem M72 Irem
IREM M92, Toaplan V1 and V2, a better x68000 core Irem; Toaplan arcade; Improve existing core
IGS PolyGame Master PGM
IGS PGM PGM
PGM PGM
PGM PGM
PGM PGM
PGM/Cave PGM; CAVE 68000
IGS PGM PGM
Pgm PGM
PGM PGM
IGS PGM (InternationalGamesSystem PolyGameMaster) PGM
Arcade cores (maybe IGS BGM) PGM
Commodore C128, Sharp X1, Fujitsu FM-7, IGS PolyGame Master Commodore 128; Sharp X1; Fujitsu FM-7; PGM
PGM Arcade PGM
IGS PGM PGM
Polygame master (taiwan) PGM
pgm PGM
CAVE 68000 or CAVE IGS PGM CAVE 68000; PGM
Pgm PGM
IGS Polygame Master PGM
Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Nintendo Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Virtual boy Virtual Boy
Pokémon Mini or Virtual Boy Pokemon Mini; Virtual Boy
Virtual Boy Virtual Boy
Virtual boy Virtual Boy
Nintendo Virtual Boy Virtual Boy
Virtual Boy Virtual Boy
Idk, all the ones I really want are in development. Virtual Boy I guess. Virtual Boy
Virtual boy Virtual Boy
system 16 System 16
System16 System 16
Sega System 16 System 16
system 16-18 System 16; System 18
System16 System 16
System-16 System 16
Sega System 16 System 16
System 16 System 16
Cave 68000, System 16 CAVE 68000; System 16
System 16 System 16
SEGA System 16 System 16
Sega System 16/24 System 16; System 32
System16 System 16
Toaplan 1 & 2, sega system16 & 32 Toaplan arcade; System 16; System 32
System 16 cores System 16
Toaplan Version 2 Toaplan arcade
Snow Bros arcade game Toaplan arcade
Snow Bros. Toaplan arcade
Toaplan arcade boards Toaplan arcade
Snow Bros arcade core Toaplan arcade
Toaplan V2 Toaplan arcade
Anything Toaplan Toaplan arcade
Toaplan v2 Toaplan arcade
sorcer striker Toaplan arcade
Truxton 2 arcade Toaplan arcade
Toaplan with Armed Police Batrider Toaplan arcade
Toaplan v2 Toaplan arcade
Toaplan Toaplan arcade
Toaplan Toaplan arcade
Slapfight Arcade game Toaplan arcade
Mac Color Other
synthesizer Other
Smaky computer range Other
Macintosh II, or something that would run MAC OS 8, and be in color. Other
Simple Z80 computers, like something that can run Grant Searle’s CP/M or RomWBW Other
Pc Other
Stand-alone sound chip implementations or a multi-chip core for direct music creation using MIDI or a tracker. Not sure this would be viable, but it’s a cool idea. Other
MT32 Other
Proper PC sim/VM (8086/286/386) Other
Tappan PCB Other
Vax Other
8088/8086 Other
Pentium Other
Chinese 100-games-in-1 I got for Christmas once Other
Pentium w. 1st gen. 3d accelerator Other
I would like to see the X68000 core receive some love. It’s there, but it’s not great and hasn’t been touched in years. Improve existing core
Minimig with Vampire AMMX and SAGA extensions Improve existing core
Perfection in current cores e.g. Apple Ii floppy write support Improve existing core
PC9801/Sharp X68000 Improve existing core; PC-9800
X68000, GP32 Improve existing core; GP32
I want to see x68000 be developed further Improve existing core
Sharp X68k Improve existing core
X68000 with MT32 pi support Improve existing core
Zx spectrum full z80 support Improve existing core
A better Macintosh core Improve existing core
x68k Improve existing core
X68000 Improve existing core
Dreamcast Dreamcast
Dreamcast if possible Dreamcast
Dreamcast (unlikely) Dreamcast
Dreamcast but probably not feasible. Dreamcast
Dreamcast Dreamcast
Dreamcast Dreamcast
Dreamcast Dreamcast
Dreamcast Dreamcast
Dreamcast Dreamcast
Dreamcast Dreamcast
CD-i CD-i
Phillips CDI! CD-i
CD-i CD-i
Philips CD-i CD-i
CDi CD-i
CD-I CD-i
Phillips CDi CD-i
CD-i CD-i
Phillips CDi CD-i
Philips Cdi CD-i
CD-i CD-i
Phillips CDi CD-i
Apple IIgs Apple IIGS
Apple 2GS Apple IIGS
Apple IIgs Apple IIGS
Apple IIGS Apple IIGS
Apple 2gs Apple IIGS
Apple IIgs Apple IIGS
Apple IIgs Apple IIGS
Apple II GS Apple IIGS
Apple IIgs Apple IIGS
Apple //gs Apple IIGS
Apple IIgs Apple IIGS
Apple IIgs Apple IIGS
FM Towns FM Towns
FM towns FM Towns
Fm towns marty FM Towns
FM Towns Marty FM Towns
FM Towns Marty FM Towns
FMTowns FM Towns
FM Towns FM Towns
Neo Geo CD NGCD
Nep geo CD NGCD
NeoGeo CD NGCD
Neogeo CD NGCD
Neo Geo CD NGCD
NeoGeo CD NGCD
Neo Geo CD NGCD
Neogeo cd NGCD
Sega System 32 System 32
Jurassic park System 32
Sega System 32 - Golden Axe: Revenge of Death Adder System 32
SEGA System 32 System 32
System32 System 32
Sega system 32 arcade System 32
Taito F3 Taito F3
TAITO F3 Taito F3
Taito F3 system Taito F3
Taito F3 Taito F3
Taito F3 Taito F3
Taito F3 Taito F3
Commodore 128 Commodore 128
Mega65, Commodore 128 MEGA65; Commodore 128
Commodore 128 Commodore 128
Commodore 128 Commodore 128
Commodore 128 with 1571 disk drive Commodore 128
Commodore 128 Commodore 128
Intellivision Intellivision
Intellivision Intellivision
Intellivision Intellivision
INTV Intellivision
Intellivision Intellivision
Intellivision Intellivision
PC-98 PC-9800
PC88/98 PC-9800
PC-98 PC-9800
PC-88 or 98 PC-8800; PC-9800
Wonderswan WonderSwan
Wonderswan WonderSwan
Bandai WonderSwan WonderSwan
Wonderswan Color WonderSwan
Wonderswan Color WonderSwan
Atari falcon Atari Falcon
Atari Falcon Atari Falcon
Atari Falcon, Amiga 4000 Atari Falcon; Amiga 400
Atari Falcon Atari Falcon
Perhaps Motorola 56000 DSP for Atari Falcon :) Atari Falcon
atari falcon Atari Falcon
Amiga CD32 Amiga CD32
CD32 Amiga CD32
Amiga CD32 Amiga CD32
Amiga CD32 , CDTV Amiga CD32; CDTV
Amiga CD32 Amiga CD32
cps2 CPS-2
cps2 CPS-2
CPS 2 CPS-2
Csp2 CPS-2
DS? I’m not sure what’s in development beyond PS1 NDS
Nintendo DS NDS
Nintendo DS NDS
Nintendo DS NDS
PSP PSP
PSP PSP
PSP PSP
PSP PSP
psi PSP
Psikyo SH2 (for Psikyo shmups and Tetris TGM2) Psikyo SH2
Psykio arcade shmups Psikyo SH2
Tetris the Grand Master 2 (PSIKYO SH2) Psikyo SH2
Psikyo SH2 Psikyo SH2
Cave CAVE 68000
PS2 PS2
PS2 PS2
PS2 (not feasible, I know) PS2
Pokémon Mini Pokemon Mini
Pokémon mini Pokemon Mini
X68000 X68000
X68000 X68000
x68000 X68000
Game & Watch Game & Watch
Game and Watch Game & Watch
Game & Watch Game & Watch
Color Macintosh (68030/68040) Motorola 68040
Motorola 68030/68040 (Amiga/Atari ST) Motorola 68040
68040 Motorola 68040
PC-FX PC-FX
Pcfx PC-FX
Sega System 18 System 18
Tandy 1000/IBM PCJr Tandy 1000
Tandy 1000 Tandy 1000
Tandy 1000 Tandy 1000
Amstrad CPC plus Amstrad CPC; Amstrad GX4000
Amstrad GX4000 Amstrad GX4000
Commnader 16 and MEGA65 just as the ZX NEXT has been added just latly. Commander X16; MEGA65
CX16 Commander X16
GP32 GP32
NeXT Cube NeXTcube
Neogeo Neo Geo
NEO GEO Neo Geo
pc-8801 PC-8800
Pico8 PICO-8
Pico-8 PICO-8
trs-80 model 4 TRS-80
TRS-80 CoCo 3 TRS-80
Thomson MO5 Thomson
Thomson T07/TO8/T09 Thomson
SuperVision Watara Supervision
Wataru Supervision Watara Supervision
80c88/8088 core (DOS) 8088
Amiga 68060 Amiga 68060
Amstrad PC1512 Amstrad PC1512
Amstrad Plus Amstrad Plus
Atari 2600 Atari 2600
5200 Atari 5200
Atari Video Music C-240 Atari Video Music
CAVE CV1000 CAVE CV1000
DEC PDP-11 DEC PDP-11
DEC VAX DEC VAX
Enterprise 128 Enterprise 128
Fairlight CMI Fairlight CMI
HP-41 HP-41C
IBM RS/6000 IBM RS/6000
Mac OS 4.6 onwards Mac OS
N-Gage N-Gage
PC XT PC XT
PDP11/70 PDP11/70
Ps5 :=) PS5
SEGA SC-3000 (added to Colecovision) SEGA SC-3000
Sega Pico Sega Pico
Sord M5 Sord M5
Sparc Sparc
Sega System 24 System 24
Tamagotchi Tamagotchi
Tandy Model 6000 Tandy 6000
VT320 VT320

What feature not currently in development would you like to see on MiSTer?

vec <- unlist(str_split(dat$Feature, "; "))
vec <- vec[vec != ""]
sorted <- sort(table(vec), decreasing = TRUE)

dat %>%
  mutate(level = sapply(Feature, function(x) find_first(x, names(sorted)))) %>%
  filter(What.feature.not.currently.in.development.would.you.like.to.see.on.MiSTer. != "") %>%
  sample_n(nrow(.)) %>%
  arrange(level) %>%
  select(What.feature.not.currently.in.development.would.you.like.to.see.on.MiSTer., Feature) %>%
  kable(col.names = NULL)
Unsure
whatever the devs enjoy is good, they work for free
I can’t say
Unsure
No idea.
N/A
N/A
Not sure as I’m pretty new to the scene
Unknown
Unsure
Unsure
Not sure
Not sure
n/a
Not sure
I would like it to make me a ham sandwich
It’s pretty damn good
Not sure. It’s pretty great.
Nothing that I can think of at the moment
i don’t mind its already great
don’t know
N/A
N/A
None
none
can’t think of any
Na
I don’t know
None
Not sure
Can’t think of any
dont know
I don’t know
None
None
I’m happy where it’s at
none
I don’t know…
idk
n/a
None
The project does everything I need it to do.
Can’t think of any: it does 100% of what I want
No answer
n/a
Unsure.
N/A
N/A
N/A
Unsure
Not sure
unsure
Don’t know
None
-
?
unsure
Can’t think of any
Anything is gravy
N/A
Not sure
n/a
Don’t know
N/A
I’m happy with the feature set. Feature creep is to be feared.
Not sure if there is a upgrade plan if we need to leave DE10
?
Not sure
Don’t know
None, it’s perfect!
Nothing, it is perfect like it is now
none
Not sure
Nothing special
Nothing
Can’t think of any. Very happy with my MiSTer.
None
Don’t know
It’s already pretty good I guess, can’t think of anything rn
Don’t know
Don’t know
Not sure
Non
I don’t follow the scene close enough to know what is/isn’t currently in development. I’d like a ‘recent’ menu option and I think that’s in there now. The surprises are what makes it fun. Big brains doing cool video game things.
It’s great already! Looking forward to what’s next, but I don’t have a feature wish list. Just arcade game wish list. (C64 updates have been excellent!)
i like where it’s at
Nothing
Na
I am not sure of the full developer set
Consistent video effects. Confusing to have filters, scandoubler effects, core-specific blending, etc. UX/UI
Better GUI UX/UI
Map screenshot capture (or other keyboard keys) to a gamepad. UX/UI
Themeable graphical frontend like Emulation Station UX/UI
better osd menu, larger display with more text visible UX/UI
Pi-HAT support, better GUI UX/UI; Other
better filesystem organisation UX/UI
A new GUI UX/UI
Generic color control. Many cores are too bright, too dark, too saturated, etc. UX/UI
Flavor/Details for cores and mras in the browser UX/UI
Frontend like recalbox UX/UI
Screen shot display UX/UI
Better user interface with box art for each game UX/UI
Family friendly front end. UX/UI
Frontend UX/UI
Recently played section UX/UI
Easier configuration of different cores - especially the computer-cores UX/UI
GB/GBA linked splitscreen, RetroAchievments, Games manual PDF reader UX/UI; Core feature; Achievements
Improved graphical frontend UX/UI
1. Alternative GUI (graphical system selection / game selection screen, game metadata, screenshots, etc)
2. Boot into last game opened on a core UX/UI
Nicer UI UX/UI
UI color/theme customization UX/UI
front end UX/UI
Attract mode and better menu graphics UX/UI
A way to add games to a favorites list (per core) UX/UI
Save states, cheats, achievement, network play, as case that turn mister into a hanheld like PiBoy DMG. Savestates; UX/UI; Achievements; Netplay; Hardware changes
Better front end UX/UI
Better GUI UX/UI
Take Screenshots with Controller Buttons UX/UI
Curated Rom downloader (I know it’s illegal) UX/UI
Search Field with on screen keyboard to look up a game and launch it. UX/UI
Favourites tagging/menu UX/UI
Better UI with games summary and screenshots during selection to choose unknow games. UX/UI
Ability to assign hotkeys to OSD options UX/UI
Richer menu system, (search features, favorites, more skinnable) UX/UI
Bezel art UX/UI
Print Screen button mapping UX/UI
Menu usability UX/UI
Customizable graphical UI UX/UI
File organization /categorization under cores (built in “Peek”) and built in attract mode File management; UX/UI
better looking menu UX/UI
Improved Ui UX/UI
Installer gui UX/UI
Custom themes UX/UI
More customization of MENU UX/UI
Frontend UX/UI
An easy to use interface to adjust video settings, like what Analogue consoles have. Editing .ini is not user friendly at all. I don’t understand video timings and would like something easy to set. UX/UI; Video output
Meta data UX/UI
Box art UX/UI
Controller support for page down/up on game select UX/UI
Better UI UX/UI
Front end UX/UI
Boxart UX/UI
Manuals/coverart UX/UI
In-game bezels/wallpaper. UX/UI
Alternative core and rom selection UI UX/UI
Better UI UX/UI
PDF manual reader UX/UI
Boxart, screenshot/video snap in menu UX/UI
Front end UX/UI
UI work, base linux system improvements (security, flexibility) UX/UI; Bugfix
Coverarts UX/UI
Overlays UX/UI
OSD user text menu UX/UI
MiSTer wide favourite lists (games from multiple cores launched from a quick menu) UX/UI
Themes UX/UI
remote rom launching UX/UI
open source framework with full customization UX/UI
A better front end GUI UX/UI
Tiny face lift? It’s already so boss. UX/UI
Nicer UI UX/UI
Simple basic graphical representation (thumbnail) of arcade cores. UX/UI
GUI with game info synced to a database UX/UI
Cover art UX/UI
Support for Bezels (PNG transparent files) in games / cores. UX/UI
Frontend UX/UI
Graphical interface UX/UI
a native (not a script) updater UX/UI
Game covers UX/UI
A prettier UI UX/UI
Customisable frontend UX/UI
Kiosk friendly UI option (for visitors/cabinets) UX/UI
Better, more graphical menus with video, images, text UX/UI
streamlined menu UX/UI
Better filesystem File management; UX/UI
Easy “Go to Top of Folder” button. UX/UI
save states and artwork if it doesnt go against developer philosophy Savestates; UX/UI
Core-specific favorites list UX/UI
Optional GUI with artwork/videos UX/UI
Skins/Themes UX/UI
A default setup for all cores and games that can be configured, filters joystick setting, sound volume normalised etc. UX/UI
OSD customization UX/UI
An option to read pdf manuals in games UX/UI
Bit more intuitive GUI. UX/UI
UI scaling/navigation (nothing too fancy) UX/UI
an optional menu for people that play on LCD that uses more of the screen allowing the user to read longer file names without the text having to scroll UX/UI
game manuals in the UI UX/UI
Get rid of that fugly front end, kthanx UX/UI
Better front end interface UX/UI
Easier to change ini for crt easier UX/UI
Set scanlines settings for multiple cores. UX/UI
Add favorites UX/UI
May be online game, A simple way to generate 250p video at 120khz, customizable hub with thumbnails, option to use original cartridges. Netplay; Video output; UX/UI; Hardware integration
Soft power on/off UX/UI
UI boarder options, especially for arcade cores Video output; UX/UI
Game menu frontend with cover art UX/UI
GUI for accessing network shares UX/UI; File management
Onscreen text help overlay for computer cores that shows simple commands and keyremapping assistance UX/UI
Enhanced Menu System UX/UI
Better GUI UX/UI
GUI with pictures/game info UX/UI
customize start up screens for cores, and for MiSTer itself would be fun! UX/UI
Reload the last core with the last rom used, auto load save state if there is one UX/UI
Some reason I still can’t change the mf background!!! UX/UI
Better virtual Tape/Disc interface UX/UI
Front end UX/UI
Better ui UX/UI
Save state, more graphical ui? Savestates; UX/UI
Basic frontend UX/UI
Some kind of visual display for what the control layout of a core was. For example, what was the arcade layout of a neogeo arcade cabinet or the keyboard of a commodore 64? UX/UI
Save States for all cores, customizable GUI for all platforms / per platform. Savestates; UX/UI
Favorites UX/UI
A proper GUI and also screen capture UX/UI; Other
ability to list and launch console games directly by name in the UI like arcade games UX/UI
Cleaner/streamlined UI UX/UI
An optional(!) menu with more eye candy UX/UI
Frontend with in game screenshots and system/game history UX/UI
Per-game config saving. My #1 most requested feature since 2019. UX/UI
Config editing e.g. video output mode from UI Video output; UX/UI
A nicer GUI “nothing too fancy though” UX/UI
OSD keyboard templates for each computer core (that highlights when you strike a key on your keyboard) UX/UI
Box art display UX/UI
Better GUI UX/UI
WebGUI maybe, a modern GUI interface UX/UI
Web-based frontend for remote management UX/UI
Custom menu systems, and fancier upscaling and filters UX/UI; Video output
A better menu. The current one is ugly. UX/UI
Proper input Architecture for Arcade Input; UX/UI
In menu global and per core resolution configuration UX/UI; Video output
More ability to customise menu system UX/UI
front end with media and metadata UX/UI
read ASCII files (eg game manuals) UX/UI
Box art in game selection screens UX/UI
EmulationStation or similar setup. Yes I know the limitations. I’m sure something could be worked out. UX/UI
Favourites list UX/UI
Graphical front end UX/UI
Attract mode UX/UI
More UI flexibility and customization UX/UI
Change UI color UX/UI
Better UI UX/UI
Media player and better cheat engine with editable codes. UX/UI
More stylish ui UX/UI
A configurable front-end that was game focused rather than format focused. UX/UI
Save states on popular cores Savestates
Save states for NES, SNES and Genesis. Savestates
More save states. Easier 5x scaling settings Savestates; Video output
Save states for all major consoles Savestates
Save States Savestates
Save states Savestates
Save states for most cores (especially SNES/Genesis) Savestates
Savestates everywhere Savestates
Save states on more cores Savestates
Universal High Score Savestates
Highscore savings on arcade machines Savestates
High score saves for arcade games Savestates
save states for all console cores Savestates
savestates for more cores Savestates
More save states, preferably on all cores eventually Savestates
Pause and Save for all cores Savestates
More save state implementations Savestates
Hiscore save in more arcade games; apply rom patches on the fly Savestates
One button save states - not multiple button presses Savestates
Save state on all cores Savestates
save states for genesis games Savestates
Core-independent universal savestates Savestates
High score saves Savestates
Save states on tg-16 :) Savestates
save state for nes Savestates
Arcade savestates Savestates
Keeping high scores Savestates
Save states for all cores. Savestates
High score save Savestates
Save states Savestates
Save states for all cores Savestates
save status Savestates
More save state support Savestates
savestates Savestates
Save states in all cores Savestates
Save states for more cores. Savestates
16bit console save states Savestates
Saves states would be huge Savestates
Save states Savestates
Save stats for SMS/Genesis/SNES/PC Engine Savestates
Better save state support Savestates
Save states in all cores Savestates
save states for all console cores Savestates
save states on all cores Savestates
More cores supported with high score saving Savestates
Save States for more cores Savestates
Savestates/ Nice Menu Savestates
Save States and Rewind Savestates
Across the board save states Savestates
save highscore feature in arcade cores Savestates
save load states, quick character select in fighting games Savestates; Other
Savestates Savestates
Save states Savestates
Can’t think of anything. Save states was the last thing I wanted. Hope to see them on all console cores eventually. Savestates
save states, which i know is partly underway Savestates
save states on all cores Savestates
Universal save states Savestates
High score saves for arcade cores Savestates
Unified savestate support Savestates
Arcade core auto highscore table saving Savestates
Save states on SNES core and other cores Savestates
More save states Savestates
Save states for cores I use Savestates
universal save states Savestates
Savestates on more cores Savestates
snes savestate, arcade highscore save Savestates
Save states Savestates
Save states Savestates
Save States for more cores Savestates
Save states across all cores as a standard Savestates
Savestates in all cores Savestates
Savestates for more console cores, online gameplay would be massive. Savestates; Netplay
Wanted save states and now they’re starting to appear so now I have no more things to ask for. Savestates
Save states Savestates
save states for different cores Savestates
Save states Savestates
Save states on other cores like Neo Geo Savestates
Save states on SNES / Genesis / PCE Savestates
Save states to more core (e.g., Sega Genesis). Savestates
50+ Save State slots Savestates
Save states on SNES & PC ENGINE CD-ROM Savestates
Save states Savestates
Save States Savestates
Savestates on more cores Savestates
Rewind Savestates
More save states for other console cores like SNES Savestates
save states for more cores Savestates
Save states across all cores. Savestates
Save states Savestates
Save states, SMS Bios support Savestates; Core feature
Save states for more systems Savestates
Save States Savestates
SNES/Genesis save states Savestates
Save states snes Savestates
SNES save state Savestates
Save states? Savestates
Save states for every core Savestates
More save states Savestates
Save states for more cores. I understand that the mapping is complicated, esp when dealing with multiple components, and that sorg prefers to keep things as vanilla and featureless as possible in the main mister cores, but save states are >>> for speedrunners/developers :) Savestates
save states for arcade cores Savestates
Save states for cores that don’t have it Savestates
Save state for more cores (not necessary but nice to have) Savestates
Rewind/Fast Forward on more cores Savestates
More universal savestates in console cores and a 60 Hz HDMI fully buffered with reduced latency over current implementation. Savestates; Video output
Arcade saving score for all arcade cores Savestates
savestates Savestates
Save states Savestates
Universal save states sand rewind Savestates
More save states Savestates
Save states Savestates
Save states Savestates
Save states in the Mega Drive/SNES cores. Savestates
More save states on more cores Savestates
Savestates for all systems Savestates
Savestates on more cores, specifically SNES Savestates
Save state Savestates
Savestates where possible Savestates
Save states Savestates
Savestates Savestates
Save states for cores that don’t have it Savestates
Savestates for more cores Savestates
Save states for more cores (Technically in development but not for all). Better GUI Savestates
A rehaul of the save system that automatically saves to SD, version controls and backs up to remote across all cores. Savestates
Width adjustment or save states Savestates; Video output
Save states on all cores where not currently available. Savestates
More save state stuff, knowing some of that is just very hard given the complexity of systems Savestates
Save states on more cores Savestates
Rewind, fast forward Savestates
Save states for cores that don’t currently support them Savestates
Better scaling for modern displays Video output
Geometry in crt Video output
S-video and Composite output from analog IO board Video output
9x scaling Video output
Better consumer CRT support over component. Video output
Screen flip on all vertical cores Video output
A larger osd where resolution permits Video output
Deinterlacing of 480i Video output
zero-lag 60hz for console cores Video output
Free zoom; OSSC-like per scanline tweaking Video output
Change background for VGA output without using scaler Video output
More scanline options Video output
Vector display output (as X/Y/I or X/Y/I/C signals), ePD (electrophoretic/e-Paper display) drivers Video output
Adjust screen for every core for rgb Video output
S-video Video output
The ability to use the scan doubler with a frame buffer on hdmi and leaving the analog video alone Video output
Native CRT H/V adjust Video output
Support for vector display / crt oscilloscope Video output
Play pc dos games on crt Video output
Jvs-support on usb-io Video output; Input
Bezels for 4:3 games on 16:10/16:9 display Video output
Svideo / composite out Video output
Neo Geo 1440p vscale_mode=0 Video output
sxreen rotation so all cores can use verical screens Video output
Bezels for arcade cores Video output
1200p native support Video output
Geometry position on all cores (for CRT adjustment) Video output
Universal 5x Video output
Composite via direct video Video output
Ability to switch upside/down screen orientation, some old arcade cores are still not playable on LCD because of orientation problem. Video output
CRT settings on all cores Video output
Analog downscale Video output
Freesync/Hdmi VRR for use with most recent TV’s and PC Monitors. Video output
Cocktail mode’ scaler for non-cocktail games Video output
hi-res video output for vector arcade games Video output
An option for 1x, 2x, 3x, etc scaling. Video output
Official V-pos and H-pos adjustment Video output
Ability to sync some cores to 60hz. Ex: NEO GEO Video output
H and V screen position in all cores Video output
Streamline video modes per core. Have 1440p screen and a 4k one Video output
RetroArch style high 240p resolutions for vga Video output
I had to think about this one! Maybe an interlaced video mode (480i) for analog as an option for playing rotated vertical games on a horizontal cga monitor? Video output
a way to do s-video out from the Analog I/O board Video output
More CRT options, like H/V centering Video output
Better screen settings Video output
Better composite video support Video output
Filters for simulating various types of CRT masks/apertures; composite video output Video output
Screen Flip on all cores. Video output
default gamme option like for filters in the main mister.ini Video output
RGB Subpixel CRT Filter Emulation. Video output
Widely available composite video for use with commodore 1702. Video output
Much easier 15 KHz output through composite cable/SVideo. Video output
Crt rotation Video output
Better scanlines / CRT-like shader filters for LCD TVs, Menu graphical themes for browsing games like EmulationStation Video output
Widescreen mode in console cores Video output
Even better CRT look with scanlines, dithering, etc Video output
4:3 Borders for GBA Video output
Variable Refresh Rate support Video output
CRT horizontal and vertical adjust Video output
Vector output Video output
composite blend in more cores Video output
Better composite integration for cores, Composite/RF CRTs are very cheap/free here in the USA. The cost of PVM/PC does not outway the performance for most. At least people that I know in my area (midwest) Video output
Complete Vertical and Horizontal resizing for all cores. But especially stretching to full-screen for handheld systems in Analog out (CRT) Video output
CRT h+v adjustment for all cores Video output
Native VGA output on ao486 (without using the scaler) Video output
Proper original resolutions for ao486 Video output
TV H/V size and position configuration per core Video output
composite / svideo Video output
Rotate screen on some arcade cores so I wouldn’t have to physically turn my CRT Video output
4K output, deep color output, with scalers/filters Video output
Option to switch core speed to exactly 60hz Video output
CRT H/V adjustment, LLAPI natively, SNAC in all cores Video output; Input; SNAC
Complex feature : better CRT-like filters with scanlines, upscaling & edge improvements… Simple feature : shortcut to increase / decrease dynamically the scaling factor applied : sometimes a bug scaling factor looks cool, sometimes it’s better to have a finer / smaller picture :) Video output
hd mode 7, Video output
Core frequency doubling. IE, to laglessly allow 240p120Hz to allow 240p on 31KHz displays Video output
A 60.00hz option with no latency like Analogue consoles. Video output
Composite output Video output
5x scaling on all possible cores Video output
Native composite out Video output
HV Frame Shift Video output
Composite Blend option for the genesis built in for ALL cores and lower strength options for non 320 pixel res games e.g 256 (the composite blend video filters don’t work on CRTs)/ H and V centring for CRT users Video output
4K HDMI video output Video output
More straightforward scaling options Video output
ARM CPU Framebuffer Processing for CRT simulation filtering Video output
Better scanlines effects Video output
Displayport output Video output
CRT shaders (like CRT-Royale), and per-game settings Video output
H&V CRT adjustment Video output
Support for composite signal Video output
Shader support (e.g. CRT Royale) (yes I know this is highly unlikely if not impossible) Video output
The ability to be used as an analogue video converter/upscaler like the ossc Other
Full-blown multi-format music player / librarian for native game music files, utilizing the different sound chip cores. With a front-end like https://mmontag.github.io/chip-player-js Other
MIDI input Other
Retroachievements, bizhawk shuffler like features Achievements; Other
Music File reader for SNES NES etc Other
Software Emulation support for non FPGA cores Other
Opensource toolchain! ;-) Other
Power on/off with controller. Other
ability to have more than 4 mister.ini profiles Other
Anti-Millennial Subsonic Douche-Repellent Frequency generator Other
Local/Remote commands/API to launch Core+ROM and get current Core+ROM etc to allow for automation and better integration projects e.g. launch games from a phone/tablet app with GUI. Dynamic LED arcade cabinet marquee, hardware buttons for direct launch of favourite cores etc Other
Stable Symlink Support Other
launching a core + game from ssh/command line Other
online leaderboards for arcade Other
Cloud saves Other
Standard use of SD CARD SLOT on analog board Other
direct curated browsing and download of content from internet archirve, roms, bios, etc. Other
Controller Screenshot Function Other
Web interface to swap cores/games Other
Built in lag tester like the time sleuth. This should measure the lag via photo diode back to gpio. Other
Backup saves and metadata to attached usb storage across all cores for easy backup. Other
Original OS Other
The ability to auto-save without opening OSD. A warning message like the one you get with the recents feature would be enough. Other
Video/Media player compatible with 15Khz analog output Other
True seamless background autosave (I.e. not having to open OSD to save) Other
Controller Battery Indicator Other
Real auto saves that don’t need call menu. Other
ADC for missing 8 bit Other
moonlight-embedded (requires a video encoder in FPGA) Other
Web API to allow launching cores and games from a third party launcher interface Other
Add Kodi to the android part. Other
mister link for 2x DE-10 Other
Support audio for USB like Astro Fones Other
Option to use hard CPU Other
CDROM audio Other
DVD ISO player Other
FPGA video player Other
Safe Shutdown option to prevent SD corruption Other
Some mobile app remote controller (like Kodi Remote) Other
screen to show game jacket Other
Load IPS patches without patching roms Other
Fan controls Other
User led ON for tate mode arcade game, OFF for horizontal mode Other
Memory interaction via USB (for autosplitters/game trackers, ex: QUSB2SNES) Other
sleep mode Other
A proper owner Other
Background updating Other
Video player that I could use in a crt Other
NSF chiptune visualizer Other
Better SMB integration Other
Safe utilities (scripts require root) Other
Jetpack Other
Playlists, some ability to connect to a network database to see recommended lists of games for each platform from popular users Other
Oc for nes Other
Power down with save data complete notification. Save file archive folder. File management; Other
Sleep / Power Save Mode Other
Tools supporting development of new software for target platforms Other
Some way to have an automatic record of games saves. Other
USB/SSD Boot (no sd needed) Other
Not really MiSTer related, but would love to see MT32pi support full AWE32 soundfont v2.01 simulation with inherited ROM samples. Other
Auto run script to connect to my network storage where my game folder is. Other
Linux console access to load core and ROMs so it can be integrated with home assistant. Other
Chromecast support / screen mirroring Other
Some kind of integration with the community on the mister itself Other
Low input lag with generic USB controllers. Other
Network play for consoles Netplay
Remote networking multiplayer Netplay
Internet multiplayer Netplay
Fightcade Netplay
Online play Netplay
On line co-op!! Netplay
Online server for mulati player online Netplay
Network play (unless this is already a thing) Netplay
online multiplayer support. either thru the MiSTer or separate device Netplay
Online multiplayer Netplay
Network Play Netplay
Netplay/X-Band emulation Netplay
internet Multiplayer Netplay
Online play Netplay
netplay Netplay
Netplay Netplay
Net play support Netplay
The next frontier would be the ability to play games with other Mister users over net code, I suppose Netplay
Network gameplay Netplay
Netplay/link cable emulation Netplay
Online play Netplay
multiplayer Netplay
Online play Netplay
Netplay Netplay
Online gaming Netplay
Online multiplayer for console games Netplay
netplay Netplay
online multiplayer Netplay
Online multiplayer Netplay
Networked multiplayer Netplay
Online multiplayer Netplay
Netplay with other MiSTer users Netplay
Rollback netcode Netplay
Netplay Netplay
Netplay Netplay
online coop? don’t think it’s possible, but it’d be cool Netplay
Netplay Netplay
Centralized way to play offline games with other MISTer users online similar to parsec. Netplay
Online Multiplayer Netplay
Online Multiplayer + cam/mic support Netplay
If possible, rollback netplay implementation. Playing locally on the mister is amazing, being able to play online with friends would also be amazing :) Netplay
Direct Online multiplayer connectivity Netplay
Retroachievements, Netplay Achievements; Netplay
Cartridge support (even via USB dumping) Hardware integration
USB CD-ROM Support Hardware integration
Cartridge Reading Hardware integration
Marquee led support Hardware integration
Real memory card access Hardware integration
original cartridges Hardware integration
Cartridge connector Hardware integration
disk drives Hardware integration
Card/cartridge reader options would be nice Hardware integration
Cartridge Adapters Hardware integration
Support for gyros in controllers like Wiimote and Dual Shock 4, and support for SMS and Famicom 3D hardware Input; Hardware integration
Optical drive input Hardware integration
Physical cartridge support Hardware integration
Exposing the nes and snes expansion slots over usb for dev purposes and potentially things like crowd control integration Hardware integration
A real double sid chip module, along the lines of mt32-pi Hardware integration
Retrode support Hardware integration
More physical hardware integration Hardware integration
Real cartridge support Hardware integration
support for original microcomputer peripherals, media and rom images Hardware integration
Being able to play 2 gb games at the same time with link cable Hardware integration
CD-ROM adapter or some kind Hardware integration
SIO support for Atari 800 via user port and/or integrated FujiNet. Better 2600 support. Apple IIe writable disk. Hardware integration
Specifically the ability to save to disk on BBC core. Hardware integration
Real disk drive connection to Mister cores (ao468,Amiga, Atari ST) Hardware integration
real Motorola 68040 addon-board Hardware integration
Use of own cartridges Hardware integration
Probably not possible, but a GBA cartridge adapter for playing gba games. Hardware integration
Cartridge support Hardware integration
Cartridge adaper Hardware integration
Making a cluster of DE-10s Hardware integration
A way to connect OG cartridges Hardware integration
Dual core interconnected, like 2 GBA cores running simultaneously, interconnected with GBA link cable Hardware integration
Use original cardrige Hardware integration
Use for real console cartridges Hardware integration
Real physical C64 cartridge reader. Real Amiga floppy drive support. Hardware integration
Combine Mister and Raspi to have some more hybrid shit Hardware integration
Maybe an ISA adapter for old computer cards, or some sort of external video card Hardware integration
Physical Carts Hardware integration
Cartridge adapter Hardware integration
Cartridge Adapter Hardware integration
Gba link cable support Hardware integration
internal low latency usb Input
Light Gun Support Input
lightgun support and some kind of wireless audio Input
Light gun compatibility Input
Auto controller layout mapping Input
Integrated BLiSSTER support in the main repo Input
ColecoVision hybridized controller+keyboard support Input
Better default settings, controller mappings included with it Input
Singen light gun compatiblity Input
Dual mouse support! Input
official lightgun support for all cores that did have OEM lightguns Input
Sinden lightgun bezel support Input
lightguns on lcd with wii sensor or similar Input
Sinden Light Gun support Input
Dual Use for USB and DB9 controller in the same Mister Menu Core Input
Lightgun support Input
Light gun for had tv’s Input
button combinaison for coin insert Input
input setup for all cores Input
Official BlisSTer support. Input
I would just like wireless controllers to not stop working after cold resets Input
Official padde/spinner Input
Official Bliss support Input
Universal joystick/controller mappings Input
wiimote/sensor bar support for lightgun games Input
Sinden light gun on LED/LCD displays Input
Lightgun support Input
Light gun support for LCD Input
Sinden lightgun Input
Good controller mapping Input
Sinden light gun support Input
LLAPI integrated in master branch as an option with snac Input; SNAC
Lightgun for LCD TV Input
Rapid fire Input
More flexible input options, e.g. map buttons from different controllers/USB devices to the same player, etc. Input
Integrated BLiSSTER support in the main repo Input
snes msu-1 for high quality audio Core feature
Uhmm, PSX? Core
PSX Core
Sega Super Scaler. e.g. Out Run, Thunder Blade Core
GUS on ao486 Core feature
better commodore core features Core feature
C64 cpu acceleration Core feature
Better disk access in ao486 (for Windows/Linux/BeOS). Automatic battery backup per game in NES, GB and Genesis. Core feature
7z support or msu1 File management; Core feature
Konami Arcade boards Core
SNES core that can run Vitor Vilela’s SMW widescreen hack. Core feature
laserdisc emulation Core
Redbook audio support in ao486 Core feature
Amstrad M4 Board Core
Floppy Support or Floppy Sounds for Amiga Core feature
MSU-1 support in SNES core Core feature
Music Player (Primarily Genesis) Core
outrun core Core
wonder swan Core
Konami Board and the Naomi, Arcade Boards that haven’t been worked on. Core
Amiga hybrid core, more performance for the 486 core including FPU support Core feature
Just more cores, especially arcade cores! Core
“68080” amiga and 8MB chip ram Core feature
Selectable bios for Master System Core feature
Apollo AC68080 core on MiSter Core
Landing Gear (Taïto, Arcade) Core
Full featured input test core that doesn’t require launching a ROM or using the awful mapping screen Core
Nintendo 64 Core
.cas file support for atari800 Core feature
N64 Core
SYSTEM 16,32 SEGA , PGM, CAVE SH3 ,capcom CPS3 Core
snes msu-1 Core feature
Nintendo 64 Core
Sega SC3000 audio cassette support Core feature
Drive support for the Ti994a, already available on Mist never ported to MiSTer Core feature
N64 Core
CDFJ/DPC+ ARM implementation for 2600 core Core feature
Game Boy two-player split screen on one screen Core feature
Scsi for ao486, or better idea. So os2 or bsd could boot Core feature
FLU in Minimig Core feature
X68000 Core
Webcam as Game Boy camera Core feature
Xbox Core
Vampire Core
SNES MSU-1 Core feature
N64 Core
Pentium 2 Core
32x Core
Pinball Simulation Core
Cheat support for arcade cores Core feature
fix for keyboard on macplus Core feature
A Gameboy Core that basically runs two Gameboys for multi-player support. Core feature
Virtual Boy Core
PS2 Core
Floppy and CD-ROM for ao486 and Minimig Core feature
Sufami Turbo support in the SNES core Core feature
Nothing immediately comes to mind besides more cores, the project feels pretty feature-rich already. Core
Konami Arcade games Core
MSU1 for SNES for enhanced soundtracks. Core feature
More arcade Core
Speed ups Core feature
Dreamcast but that is a pipe dream due to hardware limitations Core
Apple II writable disks Core feature
PlayStation Core
MSU-1 Core feature
Drum mode support for DOS AdLib Core feature
Gamecube Core
More cores that utilise hybrid emulation, combination of the FPGA and the ARM core(s) Core
Floppy and IDE bus emulation on ao486 Core feature
Genesis/MD EEPROM Support Core feature
Dedicated music player/tracker cores for various FM synthesis sound chips, i.e. Yamaha YMF262 Core
Writeable disks in Apple 2 core Core feature
N64 SNAC Core; SNAC
2-player Gameboy support Core feature
irem M92 Core
Better Power Supply/Cleaner File Structure Hardware changes; File management
a UI that can more easily deal with a large volume of games File management
use of sata or nvme drives on ext4. Something that would be able to support symbolic links. File management
NFS (network file system) compatibility and his configuration script File management
Dynamic ROM sorting File management
Better onboard file system support File management
Network storage devices File management
An easy-to-use Linux-based file manager for copying to/from external media like USB drives or other SD cards. File management
Save swapping File management
filtering arcade cores by horizontal/vertical orientation File management
directory structure customization / core selection (not requiring to download all cores on updates) File management
Symlinks/favorites, something like that to make multiple ways of organizing games instead of just alphabetical File management
Console mra File management
OLED screen support that shows mister specs and current game/system Hardware changes
Built in 2.4 GHz for controller. Hardware changes
A full mini itx I/O board Hardware changes
More IO Hardware changes
Fix HDMI CEC issues Hardware changes
Single height board expansion with vga - scart - audio and usb to fit into retro cases without the need for all types of extension leads. Hardware changes
native SATA for SSD , MP401 wave header , Hardware changes
a board with db9 that we dont need to solder Hardware changes
Wifi and BT integrated on DE-10 Hardware changes
USB AUDIO. SO I can use my bluetooth headphones Hardware changes
Custom PCB/FPGA with HDMI 2.1 for 4K output and VRR Hardware changes
2-Player SNAC or LLAPI in Main SNAC
Multiple SNAC ports (2 - 4), if possible SNAC
SNAC GPIO daughter board…XD SNAC
More SNAC input types SNAC
A SNAC PS1 and Saturn controller adapter. SNAC
2 players SNAC or alternative to LLAPI SNAC
Better SNAC support SNAC
SNAC for Arcade Cores SNAC
Further support for SNAC SNAC
Retro Achievements Achievements
RetroAchievements Achievements
Retroachievements would be amazing! Achievements
RetroAchievements Achievements
Retro achievements Achievements
a case that doesn’t look like a brick Aesthetics
A case that isn’t ugly as hell. I I love the MiSTer, but all the cases are ugly, even the aluminum ones. It’s the one and only meaningful thing Analogue has on the MiSTer. Aesthetics
A case that looks like a console Aesthetics
Console like case. Aesthetics
Better looking cases with all I/Os in back Aesthetics
console-looking cases Aesthetics
Nicer cases Aesthetics
Not more cores, but even better accuracy Bugfix
Maybe not a feature, but a frequent bug I notice where, if I’m on a core too long (especially NeoGeo), it becomes unresponsive. No buttons work. Cannot get to the Mister menu. Have to unplug the Mister. Possibly a memory leak? I’m not skilled enough to diagnose nor resolve. It’s my only complaint to an otherwise fantastic hardware kit. Bugfix
Would love to see a real fix for the “scrambled video” problem after multiple core reboots Bugfix
Better wifi dongle support Bugfix
Better documentation for cores and video filters. While information can be found on the github pages, something more centralized and easier to navigate for regular users would be nice. Community support
Core writing tutorial Community support
Development Tutorials so more people can jump in and enhance Mister Community support

Thank you!