They require the library rimage.
To load the image, use:
y <- read.jpeg("path")
To display the image, use:
plot(y)
data:image/s3,"s3://crabby-images/a6ea4/a6ea4bc9c2802d8339c036cc8dfc2a5d1c9743b2" alt=""
rgb2sepia <- function(img){
iRed <- img[,,1]*255
iGreen <- img[,,2]*255
iBlue <- img[,,3]*255
oRed <- iRed * .393 + iGreen * .769 + iBlue * .189
oGreen <- iRed * .349 + iGreen * .686 + iBlue * .168
oBlue <- iRed * .272 + iGreen * .534 + iBlue * .131
qw <- array( c(oRed/255 , oGreen/255 , oBlue/255), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2sepia(y))
data:image/s3,"s3://crabby-images/d8909/d890985187dacfe866ed907b9ba9a140e31180f6" alt=""
rgb2neg <- function(img){
iRed <- img[,,1]
iGreen <- img[,,2]
iBlue <- img[,,3]
oRed <- (1 - iRed)
oGreen <- (1 - iGreen)
oBlue <- (1 - iBlue)
qw <- array( c(oRed, oGreen, oBlue), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2neg(y))
data:image/s3,"s3://crabby-images/4b7a9/4b7a92fc8ad66a194992a0826542f3b970ad7174" alt=""
pixmatr <- function(a, n){
aa <- seq(1,dim(a)[1],n)
ll <- seq(1,dim(a)[2],n)
for(i in 1:(length(aa)-1) ){
for(j in 1:(length(ll)-1) ){
sub1 <- a[aa[i]:(aa[i+1]-1),ll[j]:(ll[j+1]-1)]
k <- mean(sub1)
sub1m <- matrix( rep(k, n*n), n, n)
a[aa[i]:(aa[i+1]-1),ll[j]:(ll[j+1]-1)] <- sub1m
}
}
for(j in 1:(length(ll)-1) ){
sub1 <- a[max(aa):dim(a)[1],ll[j]:(ll[j+1]-1)]
k <- mean(sub1)
sub1m <- matrix( rep(k, nrow(sub1)*ncol(sub1)), nrow(sub1), ncol(sub1))
a[max(aa):dim(a)[1],ll[j]:(ll[j+1]-1)] <- sub1m
}
for(i in 1:(length(aa)-1) ){
sub1 <- a[aa[i]:(aa[i+1]-1),max(ll):dim(a)[2]]
k <- mean(sub1)
sub1m <- matrix( rep(k, nrow(sub1)*ncol(sub1)), nrow(sub1), ncol(sub1))
a[aa[i]:(aa[i+1]-1),max(ll):dim(a)[2]] <- sub1m
}
sub1 <- a[max(aa):dim(a)[1], max(ll):dim(a)[2]]
k <- mean(sub1)
sub1m <- matrix( rep(k, nrow(sub1)*ncol(sub1)), nrow(sub1), ncol(sub1))
a[max(aa):dim(a)[1], max(ll):dim(a)[2]] <- sub1m
a
}
rgb2pix <- function(img,n){
iRed <- img[,,1]*255
iGreen <- img[,,2]*255
iBlue <- img[,,3]*255
oRed <- pixmatr(iRed,n)
oGreen <- pixmatr(iGreen,n)
oBlue <- pixmatr(iBlue,n)
qw <- array( c(oRed/255 , oGreen/255 , oBlue/255), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2pix(y, 6))
plot(rgb2pix(y, 10))
data:image/s3,"s3://crabby-images/896f2/896f29f8805b9133292643f10918d6e7e2808067" alt=""
data:image/s3,"s3://crabby-images/23cb3/23cb381f253f9ce4097a1b610742f8b3f05048dc" alt=""
rgb2blu <- function(img){
iRed <- img[,,1]
iGreen <- img[,,2]
iBlue <- img[,,3]
oRed <- matrix(0, dim(iRed)[1], dim(iRed)[2])
oGreen <- iGreen
oBlue <- iBlue
qw <- array( c(oRed, oGreen, oBlue), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2blu(y))
data:image/s3,"s3://crabby-images/2eff7/2eff7582ed27e586ced23388533452c33370fd8f" alt=""
rgb2vio <- function(img){
iRed <- img[,,1]
iGreen <- img[,,2]
iBlue <- img[,,3]
oRed <- iRed
oGreen <- matrix(0, dim(iRed)[1], dim(iRed)[2])
oBlue <- iBlue
qw <- array( c(oRed, oGreen, oBlue), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2vio(y))
data:image/s3,"s3://crabby-images/efa99/efa99901aa405758ae1665629695cbb9a909bbb7" alt=""
rgb2yel <- function(img){
iRed <- img[,,1]
iGreen <- img[,,2]
iBlue <- img[,,3]
oRed <- iRed
oGreen <- iGreen
oBlue <- matrix(0, dim(iRed)[1], dim(iRed)[2])
qw <- array( c(oRed, oGreen, oBlue), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2yel(y))
data:image/s3,"s3://crabby-images/3c3fc/3c3fc7b0e9692d6017413481542bea3d972def28" alt=""
rgb2bri <- function(img, n){
iRed <- img[,,1]
iGreen <- img[,,2]
iBlue <- img[,,3]
oRed <- iRed + (iRed * n)
oGreen <- iGreen + (iGreen * n)
oBlue <- iBlue + (iBlue * n)
qw <- array( c(oRed, oGreen, oBlue), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2bri(y, +0.5))
plot(rgb2bri(y, -0.5))
data:image/s3,"s3://crabby-images/427c4/427c4831e979310f537185b8e4c05f635c4f6b56" alt=""
data:image/s3,"s3://crabby-images/33743/33743cc2b065cc3b3afce76c50250f7d5ffa65e4" alt=""
rgb2ban <- function(img, n){
iRed <- img[,,1]*255
iGreen <- img[,,2]*255
iBlue <- img[,,3]*255
band_size <- trunc(255/n)
oRed <- band_size * trunc(iRed / band_size)
oGreen <- band_size * trunc(iGreen / band_size)
oBlue <- band_size * trunc(iBlue / band_size)
qw <- array( c(oRed/255, oGreen/255, oBlue/255), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2ban(y, 5))
plot(rgb2ban(y, 10))
data:image/s3,"s3://crabby-images/4341a/4341a1b78e41a0d0b609e6351e1da2e5c70b0556" alt=""
data:image/s3,"s3://crabby-images/0ef46/0ef4623882e225b93f694db63f160d5057a52238" alt=""
rgb2sol <- function(img){
iRed <- img[,,1]*255
iGreen <- img[,,2]*255
iBlue <- img[,,3]*255
for(i in 1:dim(iRed)[1]){
for(j in 1:dim(iRed)[2]){
if(iRed[i,j]<128) iRed[i,j] <- 255-2*iRed[i,j]
else iRed[i,j] <- 2*(iRed[i,j]-128)
}
}
for(i in 1:dim(iGreen)[1]){
for(j in 1:dim(iGreen)[2]){
if(iGreen[i,j]<128) iGreen[i,j] <- 255-2*iGreen[i,j]
else iGreen[i,j] <- 2*(iGreen[i,j]-128)
}
}
for(i in 1:dim(iBlue)[1]){
for(j in 1:dim(iBlue)[2]){
if(iBlue[i,j]<128) iBlue[i,j] <- 255-2*iBlue[i,j]
else iBlue[i,j] <- 2*(iBlue[i,j]-128)
}
}
qw <- array( c(iRed/255, iGreen/255, iBlue/255), dim=c(dim(iRed)[1],dim(iRed)[2],3) )
imagematrix(qw, type="rgb")
}
plot(rgb2sol(y))
data:image/s3,"s3://crabby-images/6d166/6d166c2120bb9de9484c5125c9c4a16154840369" alt=""