xy=expand.grid(y=seq(0,70,0.5),
                x=seq(0,13,1.5))

dim(xy)
## [1] 1269    2
cat("Hileras:",length(seq(0,13,1.5)),"\n")
## Hileras: 9
cat("Planta:",length(seq(0,70,0.55)))
## Planta: 128
xy2=plot(xy,cex=0.5,xlab="Planta",ylab="Hilera",axes=F)

library(clhs)
## Warning: package 'clhs' was built under R version 4.2.2
res <- clhs(xy[,c(1,2)], size = 45, progress = FALSE, simple = TRUE)
plot(xy$y,xy$x, cex=0.5, xlab = "Plantas",
     ylab = "Hileras")
points(xy$y[res], xy$x[res],pch=16)

res2 <- clhs(xy, size = 45, progress = FALSE, simple = TRUE)
plot(xy$y,xy$x, xlab = "Hileras",
     ylab = "Plantas")
points(xy$y[res2],xy$x[res2],pch=16, cex=0.8, col="red")