library(ggplot2)

sig <- function(x){
  
  d <- 1/(1+exp(-x))
  
  return(d)
}

x.sig <- seq(-5,5,by=0.01)

y.sig <- sapply(x.sig,sig)

df1 <- data.frame(x.sig,y.sig)
ggplot(df1, aes(x= x.sig, y= y.sig))+
  geom_line(color = "brown", size = 1) +
  labs(title = "Función Logística") +
  theme_minimal()+ theme_classic()+
  theme(panel.border = element_rect(fill = "transparent", color = "black", linewidth = 1.5))+
  theme(panel.grid.major.x = element_line(color = "grey",
                                          linewidth = 0.25,
                                          linetype = 1)) +
  theme(panel.grid.minor.y = element_line(color = "grey",
                                          linewidth = 0.25,
                                          linetype = 1)) +
  theme(panel.grid.major.y = element_line(color = "grey",
                                          linewidth = 0.25,
                                          linetype = 1)) +
  theme(panel.grid.minor.x = element_line(color = "grey",
                                          linewidth = 0.25,
                                          linetype = 1))
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.