That was good in that the arrows look like part of the figure.
In this problem I have two choices. The easy one is that this is a one-off 
task. The easy solution (for me) is to to offload the figure to another program 
and add the arrows manually. They will look like I want and I will be done in 5 
to 10 minutes. It might take a few minutes longer if I find that PowerPoint is 
not quite working out and I need a program like Photoshop. I can copy-paste, or 
change the output file type. The difficult problem is where this is one case in 
a broader application where I need to graph a function within the specified 
range and add arrows to the ends of the function if it continues beyond the 
plotted limits as expected from the plotted portion. If this is for a classroom 
it may use methods far beyond the abilities of the students present 
(programming, and mathematically).

Arrows for sin(x) or tan(x) do not make as much sense as for the x^2 function 
provided. The program does not catch cases where the function may be undefined 
or change directions outside the printed range. The arrow gives the impression 
that the figure will continue in the same direction for all x outside of the 
printed range.
Calculus gives us a way to check function performance. Something like this, 
though I suspect this is a start rather than a final solution:
library(ggplot2)
library(grid)
library(numDeriv)

Min_x <- -10
Max_x <- 1
my_function <- "x^2 / (1 - x)"

f_expr <- parse(text = my_function)
f <- function(x) eval(f_expr[[1]], envir = list(x = x))
detect_discontinuity <- function(f, Min_x, Max_x, buffer = 2, n = 1000, 
jump_tol = 100) {
  x_seq <- seq(Min_x - buffer, Max_x + buffer, length.out = n)
  y_seq <- tryCatch(f(x_seq), error = function(e) rep(NA, length(x_seq)))
  bad_vals <- !is.finite(y_seq)
  jumps <- abs(diff(y_seq))
  big_jump <- which(jumps > jump_tol)
  discont_locs <- sort(unique(c(
    x_seq[bad_vals],
    x_seq[big_jump]
  )))

  list(
    discontinuities = discont_locs,
    has_left = any(discont_locs < Min_x),
    has_right = any(discont_locs > Max_x)
  )
}
plot_with_discontinuity_check <- function(f, Min_x, Max_x) {
  check <- detect_discontinuity(f, Min_x, Max_x)

  p <- ggplot() +
    stat_function(
      fun = f,
      color = "blue", linewidth = 1.25,
      xlim = c(Min_x, Max_x)
    ) +
    theme_linedraw()
  print(p)
  grid.force()
  if (!check$has_left && !check$has_right) {
    grid.edit("GRID.polyline", grep = TRUE, arrow = arrow(ends = "both"))
  } else if (!check$has_left) {
    grid.edit("GRID.polyline", grep = TRUE, arrow = arrow(ends = "first"))
  } else if (!check$has_right) {
    grid.edit("GRID.polyline", grep = TRUE, arrow = arrow(ends = "last"))
  }
  if (check$has_left) {
    grid.text("Left: Discontinuity prevents extension",
              x = unit(0.05, "npc"), y = unit(0.95, "npc"),
              just = "left", gp = gpar(col = "black", fontsize = 8))
  }
  if (check$has_right) {
    grid.text("Right: Discontinuity prevents extension",
              x = unit(0.95, "npc"), y = unit(0.95, "npc"),
              just = "right", gp = gpar(col = "black", fontsize = 8))
  }
}
plot_with_discontinuity_check(f, Min_x, Max_x)

I suspect there are better approaches, but some form of error checking is 
essential to ensure that arrows are appropriate at both ends of the function as 
graphed. Graphs should not lie, but that is a difficult task in the generic 
problem. Prove that the function does not change direction or have a 
discontinuity outside the printed range from -infinity to +infinity. It is also 
possible that the graph is well behaved on one side but not the other.

Is there a better solution? Are there other ways to check for conditions that 
might make arrows inappropriate?
One could check and see if the graph ends at a discontinuity and add a bar at 
the end of the line. One might check to see if a discontinuity occurs within 
the figure and add a bar at the end of each line at the point of the 
discontinuity. I think the current graph glosses over the problem. How broadly 
does one define a function? Is this a function with respect to this problem: 
Ifelse(x>4,x^2,3x*x^0.5)?

Tim

-----Original Message-----
From: Paul Murrell <p...@stat.auckland.ac.nz>
Sent: Sunday, August 3, 2025 5:01 PM
To: Rui Barradas <ruipbarra...@sapo.pt>; Ebert,Timothy Aaron <teb...@ufl.edu>; 
Thomas Subia <tgs...@yahoo.com>; r-help@r-project.org
Subject: Re: [R] ggplot with arrows

[External Email]

Hi

At the risk of being labelled a "purist", you do not have to leave R to gain 
access to the underlying components and modify them.

The following code combines Rui's tidy up of the ggplot() call with an example 
of directly modifying the underlying 'grid' grob to add arrows to the ends.  
There are more arguments in arrow() that you can explore if you want to.


library(ggplot2)
library(grid)

ggplot() +
   stat_function(
     fun = function(x) x^2,
     color = "blue", linewidth = 1.25,
     xlim = c(-5, 5)
   ) +
   theme_linedraw()

grid.force()
## Check the name of the line grob
## grid.ls()
grid.edit("GRID.polyline", grep=TRUE,
           arrow=arrow(ends="both"))


Hope that helps.

Paul


On 2/08/2025 3:24 am, Rui Barradas wrote:
> On 8/1/2025 4:15 PM, Rui Barradas wrote:
>> On 8/1/2025 3:43 PM, Ebert,Timothy Aaron wrote:
>>> I would save the graph as a PowerPoint object and then edit it in
>>> PowerPoint.
>>> library(ggplot2)
>>> library(grid)
>>> library(officer)
>>> library(rvg)
>>> x <- seq(-5, 5, length.out = 100)
>>> y <- x^2
>>> data <- data.frame(x, y)
>>> plot <- ggplot(data, aes(x, y)) +
>>>    geom_path(color = "blue", linewidth = 1.25) +
>>>    geom_segment(
>>>      aes(x = x[1], y = y[1], xend = x[100], yend = y[100]),
>>>      arrow = arrow(angle = 20, type = "closed", ends = "both",
>>> length = unit(0.2, "inches")),
>>>      color = "red"
>>>    ) +
>>>    theme_linedraw()
>>> doc <- read_pptx()
>>> doc <- add_slide(doc, layout = "Title and Content", master = "Office
>>> Theme")
>>> doc <- ph_with(doc, dml(ggobj = plot), location =
>>> ph_location_fullsize())
>>> print(doc, target = "quadratic_with_arrows.pptx")
>>>
>>> If I remember I think you have to ungroup it in PowerPoint and then
>>> all elements become editable. The general approach can be done with
>>> other file formats/programs, not just PowerPoint.
>>> Tim
>>>
>>> -----Original Message-----
>>> From: R-help <r-help-boun...@r-project.org> On Behalf Of Thomas
>>> Subia via R-help
>>> Sent: Friday, August 1, 2025 10:31 AM
>>> To: r-help@r-project.org
>>> Subject: [R] ggplot with arrows
>>>
>>> [External Email]
>>>
>>> Consider:
>>>
>>> x <- seq(-5,5,length.out = 100)
>>> y <- x^2
>>> data <- data.frame(x,y)
>>> library(ggplot2)
>>> ggplot(data,aes(x,y))+
>>>    stat_function(
>>>      fun = function(x) x^2,
>>>      color = "blue", linewidth = 1.25
>>>    ) +
>>>    theme_linedraw()
>>> I'd like to add an arrow to the ends of curve to illustrate the
>>> curve continues indefinitely in that direction, ChatGPT suggests
>>> using geom_segment or geom_link but there has an easier way to do this.
>>>
>>> Any suggestions would be appreciated.
>>>
>>>
>>>          [[alternative HTML version deleted]]
>>>
>>> ______________________________________________
>>> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
>>> https://st/
>>> at.ethz.ch%2Fmailman%2Flistinfo%2Fr-help&data=05%7C02%7Ctebert%40ufl
>>> .edu%7C08d5151875104acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a6233
>>> 1e1b84%7C0%7C0%7C638898516666803962%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0
>>> eU1hcGkiOnRydWUsIlYiOiIwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIs
>>> IldUIjoyfQ%3D%3D%7C0%7C%7C%7C&sdata=D%2FYdiTEKELZpAQrNx6swSm%2BbuIG%
>>> 2Bwln6aNImfl3ogl8%3D&reserved=0 PLEASE do read the posting guide
>>> https://ww/
>>> w.r-project.org%2Fposting-&data=05%7C02%7Ctebert%40ufl.edu%7C08d5151
>>> 875104acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a62331e1b84%7C0%7C0
>>> %7C638898516666831414%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0eU1hcGkiOnRydW
>>> UsIlYiOiIwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIsIldUIjoyfQ%3D%
>>> 3D%7C0%7C%7C%7C&sdata=CJpx9Ctsp3f1M85qYi95ZAUW2eTV7O7I9yBVeFLOK74%3D
>>> &reserved=0
>>> guide.html
>>> and provide commented, minimal, self-contained, reproducible code.
>>>
>>> ______________________________________________
>>> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
>>> https://st/
>>> at.ethz.ch%2Fmailman%2Flistinfo%2Fr-help&data=05%7C02%7Ctebert%40ufl
>>> .edu%7C08d5151875104acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a6233
>>> 1e1b84%7C0%7C0%7C638898516666843559%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0
>>> eU1hcGkiOnRydWUsIlYiOiIwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIs
>>> IldUIjoyfQ%3D%3D%7C0%7C%7C%7C&sdata=hpbeujBEoZL6iT4nktp5AlT59OX9ipn5
>>> e4zZOXOzo9U%3D&reserved=0 PLEASE do read the posting guide
>>> https://ww/
>>> w.r-project.org%2Fposting-&data=05%7C02%7Ctebert%40ufl.edu%7C08d5151
>>> 875104acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a62331e1b84%7C0%7C0
>>> %7C638898516666854776%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0eU1hcGkiOnRydW
>>> UsIlYiOiIwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIsIldUIjoyfQ%3D%
>>> 3D%7C0%7C%7C%7C&sdata=UAHkZfEudzeqGLHXuSsBVc%2FcWi9LXH5iU2vesxwPK7c%
>>> 3D&reserved=0
>>> guide.html
>>> and provide commented, minimal, self-contained, reproducible code.
>> Hello,
>>
>> First of all, according to the documentation ?stat_function, section
>> Arguments,
>>
>>
>> data
>> Ignored by stat_function(), do not use.
>>
>>
>> As for the arrows, first get the equations of the lines tangent to
>> the end points of the parabola,
>>
>> y = -10*x - 25
>> y = 10*x - 25
>>
>> then compute segments' end points and plot.
>>
>>
>> f <- function(x, b = -25, m) m*x + b
>> arrow_data <- data.frame(
>>    id = c("n", "p"),
>>    x = c(-5, 5),
>>    y = f(c(-5, 5), m = c(-10, 10)),
>>    xend = c(-6, 6),
>>    yend = f(c(-6, 6), m = c(-10, 10))
>> )
>>
>> ggplot() +
>>    stat_function(
>>      fun = function(x) x^2,
>>      color = "blue", linewidth = 1.25,
>>      xlim = c(-5, 5)
>>    ) +
>>    geom_segment(
>>      data = arrow_data,
>>      mapping = aes(x = x, y = y, xend = xend, yend = yend, group = id),
>>      arrow = arrow(length = unit(0.5, "cm")),
>>      linewidth = 1.25,
>>      linetype = "dashed",
>>      inherit.aes = FALSE
>>    ) +
>>    theme_linedraw()
>>
>>
>>
>> Remove linetype and add color if you want.
>>
>> Hope this helps,
>>
>> Rui Barradas
>>
>> ______________________________________________
>> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
>> https://sta/
>> t.ethz.ch%2Fmailman%2Flistinfo%2Fr-help&data=05%7C02%7Ctebert%40ufl.e
>> du%7C08d5151875104acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a62331e1
>> b84%7C0%7C0%7C638898516666865879%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0eU1h
>> cGkiOnRydWUsIlYiOiIwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIsIldUI
>> joyfQ%3D%3D%7C0%7C%7C%7C&sdata=%2FHg3hccAA2VzI9ewCTjVd3DHf91CdJff92h5
>> AJrufMs%3D&reserved=0 PLEASE do read the posting guide
>> https://www/
>> .r-project.org%2Fposting-&data=05%7C02%7Ctebert%40ufl.edu%7C08d515187
>> 5104acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a62331e1b84%7C0%7C0%7C
>> 638898516666877207%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0eU1hcGkiOnRydWUsIl
>> YiOiIwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIsIldUIjoyfQ%3D%3D%7C
>> 0%7C%7C%7C&sdata=zvwHm2iCBTPAPuwELSupCDmCZ3Mcq%2BpYz%2Fr7SuMyZT4%3D&r
>> eserved=0
>> guide.html
>> and provide commented, minimal, self-contained, reproducible code.
> Hello,
>
> Sorry, my previous code is a bit messy.
>
> You don't need to group, so I removed 'id' from the arrow_data.
> It's better to define the arrows' end points x coordinates as
> variables, it makes it easier to change the plot at will.
>
> And the function is now defined with the intercept as last argument.
>
> f <- function(x, m, b = -25) m*x + b
>
> # here plot with linetype = "dashed"
> x0 <- c(-5, 5)
> x1 <- c(-6, 6)
> arrow_data <- data.frame(
>    x = x0,
>    y = f(x = x0, m = c(-10, 10)),
>    xend = x1,
>    yend = f(x = x1, m = c(-10, 10))
> )
>
> ggplot() +
>    stat_function(
>      fun = function(x) x^2,
>      color = "blue", linewidth = 1.25,
>      xlim = c(-5, 5)
>    ) +
>    geom_segment(
>      data = arrow_data,
>      mapping = aes(x = x, y = y, xend = xend, yend = yend),
>      arrow = arrow(length = unit(0.5, "cm")),
>      linewidth = 1.25,
>      linetype = "dashed",
>      inherit.aes = FALSE
>    ) +
>    theme_linedraw()
>
>
> #---
>
> # here the line type is the default solid, so # start the arrows a bit
> away from the parabola, 0.1 away.
> x0 <- c(-5.1, 5.1)
> x1 <- c(-6, 6)
> arrow_data <- data.frame(
>    x = x0,
>    y = f(x = x0, m = c(-10, 10)),
>    xend = x1,
>    yend = f(x = x1, m = c(-10, 10))
> )
>
> ggplot() +
>    stat_function(
>      fun = function(x) x^2,
>      color = "blue", linewidth = 1.25,
>      xlim = c(-5, 5)
>    ) +
>    geom_segment(
>      data = arrow_data,
>      mapping = aes(x = x, y = y, xend = xend, yend = yend),
>      arrow = arrow(length = unit(0.5, "cm")),
>      linewidth = 1.25,
>      inherit.aes = FALSE
>    ) +
>    theme_linedraw()
>
>
> Hope this helps,
>
> Rui Barradas
>
> ______________________________________________
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> https://stat/
> .ethz.ch%2Fmailman%2Flistinfo%2Fr-help&data=05%7C02%7Ctebert%40ufl.edu
> %7C08d5151875104acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a62331e1b84
> %7C0%7C0%7C638898516666888977%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0eU1hcGki
> OnRydWUsIlYiOiIwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIsIldUIjoyfQ
> %3D%3D%7C0%7C%7C%7C&sdata=yCA5NQav4WOgUjjI9SifFdGomE0Ze%2BJhfd9q18gI%2
> BAQ%3D&reserved=0 PLEASE do read the posting guide
> https://www/.
> r-project.org%2Fposting-&data=05%7C02%7Ctebert%40ufl.edu%7C08d51518751
> 04acc0a3208ddd2d0d5b2%7C0d4da0f84a314d76ace60a62331e1b84%7C0%7C0%7C638
> 898516666900339%7CUnknown%7CTWFpbGZsb3d8eyJFbXB0eU1hcGkiOnRydWUsIlYiOi
> IwLjAuMDAwMCIsIlAiOiJXaW4zMiIsIkFOIjoiTWFpbCIsIldUIjoyfQ%3D%3D%7C0%7C%
> 7C%7C&sdata=8%2FhroJSwSWtqnRmI1CboaEeOnubjG%2FVUpBAM4kU9%2B54%3D&reser
> ved=0
> guide.html
> and provide commented, minimal, self-contained, reproducible code.

--
Dr Paul Murrell (he/him)
Te Kura Tatauranga | Department of Statistics Waipapa Taumata Rau | The 
University of Auckland Private Bag 92019, Auckland 1142, New Zealand
64 9 3737599 x85392
p...@stat.auckland.ac.nz
http://www.stat.auckland.ac.nz/~paul/

______________________________________________
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide https://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.

Reply via email to