R 语言绘制肖像画

简介: R 语言绘制肖像画

简介

最近在网上冲浪🏄时,发现了这样一个博客[1],该博客使用层次聚类方法绘制简笔画,完整代码见仓库[2]

思想:加载照片后,使用 imager 包中的 thresold() 函数将值转化为黑白图像。之后,随机采样样本并使用聚类算法得到聚类点并进行连接。

教程

安装包

读者需要安装以下包:

install.packages("imager")
install.packages("tidyverse")
install.packages("purrr")

加载与处理图形

library(imager)
library(tidyverse)
library(purrr)
# 照片位置设定
file="img/frankenstein.jpg"


加载图形,转换为灰度,并过滤和采样图像。

load.image(file) %>% 
  grayscale() %>% 
  threshold("45%") %>% 
  as.cimg() %>% 
  as.data.frame() -> franky

相关函数

  1. clustResultx:切割树突,并移除仅由一个点形成的簇
clustResultx <- function(x) {
  clustCut <- tibble(cluster_id = cutree(clusters, x)) %>% bind_cols(data)
  clustCut %>% group_by(cluster_id) %>% 
    summarize(size = n()) %>% 
    filter(size > 1) %>% 
    select(cluster_id) %>% 
    inner_join(clustCut, by = "cluster_id") -> clustCut
  return(clustCut)
  }
  1. add_segments:添加比较两个连续聚类的结果
add_segments <- function(x){
  df1 <- clustEvol[[x]]
  df0 <- clustEvol[[x-1]]
  new_points <- anti_join(df1, df0, by = "id")
  # If a new point is added to an existing cluster
  new_points %>% 
    inner_join(df1, by = "cluster_id", suffix = c(".1", ".2")) %>% 
    filter(id.1 != id.2) %>% 
    mutate(d = sqrt((x.1 - x.2)^2 + (y.1 - y.2)^2)) %>% 
    group_by(id.1) %>% 
    arrange(d) %>% 
    slice(1) %>% 
    select(p1 = id.1, p2 = id.2) %>% 
    ungroup -> new_segments1
  # If a new 2-points cluster is generated
  new_points %>% anti_join(bind_rows(select(new_segments1, id = p1), 
                                     select(new_segments1, id = p2)), by = "id") %>% 
    group_by(cluster_id) %>% 
    ungroup -> unpaired_points
  unpaired_points %>% inner_join(unpaired_points, by = "cluster_id", suffix = c(".1", ".2")) %>% 
    filter(id.1 < id.2) %>% 
    select(p1 = id.1, p2 = id.2) -> new_segments2
  # If two existing clusters are joined
  new_points <- anti_join(df1, df0, by = c("id", "cluster_id"))
  new_points %>% 
    inner_join(df1, by = "cluster_id", suffix = c(".1", ".2")) %>% 
    filter(id.1 != id.2) %>% 
    anti_join(new_points, by = c("id.2" = "id")) %>% 
    mutate(d = sqrt((x.1 - x.2)^2 + (y.1 - y.2)^2)) %>% 
    arrange(d) %>% 
    slice(1) %>% 
    select(p1 = id.1, p2 = id.2) %>% 
    ungroup -> new_segments3
  bind_rows(new_segments1, new_segments2, new_segments3)
}

算法应用

# 样本大小
n <- 2500
# 随机抽取图形中的样本
franky %>% 
  sample_n(n, weight=(1-value)) %>% 
  select(x,y) %>% mutate(id = row_number()) -> data
# 各点之间距离计算
dist_data <- dist(data %>% select(-id), method = "euclidean")
# 分层聚类
clusters <- hclust(dist_data, method = 'single')
# 列出所有可能的集群,从大到小
nrow(data):1 %>% 
  map(function(x) clustResultx(x)) -> clustEvol
# Segments of clusters
2:length(clustEvol) %>% 
  map(function(x) add_segments(x)) %>% 
  bind_rows() -> segments_id
# Segments in (x, y) and (xend, yend) format
segments_id %>% 
  inner_join(data, by = c("p1" = "id"), suffix = c(".1", ".2")) %>% 
  inner_join(data, by = c("p2" = "id"), suffix = c(".1", ".2")) %>% 
  select(x = x.1, y = y.1, xend = x.2, yend = y.2) -> segments

注意:运行本文所有代码,大概需要花费3-4分钟。请耐性等待~

绘图

ggplot(segments) + 
  geom_curve(aes(x = x, y = y, xend = xend, yend = yend),
             ncp = 10) +
  scale_x_continuous(expand=c(.1, .1)) +
  scale_y_continuous(expand=c(.1, .1), trans = scales::reverse_trans()) +
  coord_equal() +
  theme_void()

通过修改采样样本数量可以得到不同的图形,例如:

其他例子

小编使用上面代码尝试了其他图形,结果如下:


参考资料

[1]

博客: https://fronkonstin.com/2019/08/05/clustering-frankenstein/

[2]

仓库: https://github.com/aschinchon/clustering-frankenstein

目录
相关文章
|
6月前
|
Python
使用Python绘制动态螺旋线:旋转动画效果
使用Python绘制动态螺旋线:旋转动画效果
86 1
|
3月前
|
机器学习/深度学习 人工智能 数据可视化
|
6月前
|
数据可视化 Python
Python中绘制3D曲面图的艺术
【7月更文挑战第4天】使用Python的Matplotlib和mpl_toolkits.mplot3d库,可以轻松绘制3D曲面图。首先安装matplotlib,然后导入numpy和相关模块。通过定义函数和使用numpy的meshgrid生成数据,接着用`plot_surface`绘制曲面,可定制色彩映射、添加标签、标题、色标、透明度和阴影。通过自定义颜色映射和添加网格线,能进一步增强图形的解读性。这些技巧使3D数据可视化更具洞察力和吸引力。
114 0
|
8月前
|
移动开发 前端开发 API
HTML5 Canvas 提供丰富的绘图API,支持绘制图形、文本、渐变和图像,助力游戏开发
【5月更文挑战第13天】HTML5 Canvas 提供丰富的绘图API,支持绘制图形、文本、渐变和图像,助力游戏开发。关键功能包括绘制基本形状、文本渲染、图像处理及渐变图案。在游戏开发中,Canvas用于绘制游戏元素、实现动画效果、精确的物理碰撞检测,并具有跨平台兼容性,为创造多样化视觉体验和互动游戏提供强大工具。随着技术进步,Canvas在游戏领域的应用将持续增长。
83 5
|
8月前
|
Python
Python——绘制圆形
Python——绘制圆形
70 0
|
8月前
|
计算机视觉 Python
OpenCV中文字的绘制与动态绘制图形讲解与实战(附Python源码)
OpenCV中文字的绘制与动态绘制图形讲解与实战(附Python源码)
204 0
|
8月前
|
计算机视觉
opencv基础图形的绘制
opencv基础图形的绘制
53 0
|
API 计算机视觉
【OpenCV图像处理3】绘制基本图形
【OpenCV图像处理3】绘制基本图形
115 0
|
数据格式
基于 R 语言的绘图技巧汇总
基于 R 语言的绘图技巧汇总
108 1
|
Python
Python绘制心型图案
Python绘制心型图案
94 0

热门文章

最新文章