Hi, everyone,
Would you please tell me how to shorten the space between the two rows of graphics?
 Clear["`*"];
 
 f[\[Alpha]_, \[Lambda]r_, \[Lambda]s_, 
 
    k_] = (-1 + (-1 + \[Alpha]) \[Lambda]s)^2/((1 + \[Alpha] \
 
 (\[Lambda]r - \[Lambda]s) + \[Lambda]s) (2 + 
 
       k - (1 + k) (-1 + \[Alpha]) \[Lambda]s)^2) - (1/(
     1 + k (1 + \[Lambda]s - \[Alpha] \[Lambda]s)))^(
    1 + 1/k) (1 + \[Lambda]s - \[Alpha] \[Lambda]s + ((2 + 
         k - (1 + k) (-1 + \[Alpha]) \[Lambda]s) ((
         k (1 + k) (-1 + (-1 + \[Alpha]) \[Lambda]s))/(
         1 + k (1 + \[Lambda]s - \[Alpha] \[Lambda]s)) - 
         Log[1/(1 + k (1 + \[Lambda]s - \[Alpha] \[Lambda]s))]))/k^2);
h1 = Labeled[
   Plot[{f[0.3, 20, 1, k], f[0.3, 1, 20, k], f[0.3, 20, 20, k]}, {k, 
     0, 10}, PlotStyle -> {Blue, Red, Green}, 
    AxesLabel -> {"k value", Increasing Speed
      }, PlotLegends -> 
     Placed[{"\[Lambda]r>\[Lambda]s", "\[Lambda]r<\[Lambda]s", 
       "\[Lambda]r=\[Lambda]s"}, Above]], "\[Alpha]=0.3"];
h2 = Labeled[
   Plot[{f[0.5, 20, 1, k], f[0.5, 1, 20, k], f[0.5, 20, 20, k]}, {k, 
     0, 10}, PlotStyle -> {Blue, Red, Green}, 
    AxesLabel -> {"k value", Increasing Speed
      }, PlotLegends -> 
     Placed[{"\[Lambda]r>\[Lambda]s", "\[Lambda]r<\[Lambda]s", 
       "\[Lambda]r=\[Lambda]s"}, Above]], "\[Alpha]=0.5"];
h3 = Labeled[
   Plot[{f[0.8, 20, 1, k], f[0.8, 1, 20, k], f[0.8, 20, 20, k]}, {k, 
     0, 10}, PlotStyle -> {Blue, Red, Green}, 
    AxesLabel -> {"k value", Increasing Speed
      }, PlotLegends -> 
     Placed[{"\[Lambda]r>\[Lambda]s", "\[Lambda]r<\[Lambda]s", 
       "\[Lambda]r=\[Lambda]s"}, Above]], "\[Alpha]=0.8"];
h4 = Labeled[
   Plot[{f[\[Alpha], 20, 1, 10], f[\[Alpha], 1, 20, 10], 
     f[\[Alpha], 20, 20, 10]}, {\[Alpha], 0, 1}, 
    PlotStyle -> {Blue, Red, Green}, 
    AxesLabel -> {"\[Alpha] value", Increasing Speed
      }, PlotLegends -> 
     Placed[{"\[Lambda]r>\[Lambda]s", "\[Lambda]r<\[Lambda]s", 
       "\[Lambda]r=\[Lambda]s"}, Above]], "k=100"];
GraphicsGrid[{{h1, h2}, {h3, h4}}]
In this groups of graphics, there are two graphics in the first row and two in the second row, but the space between the rows are so large, I wonder if there is any solution to solve this problem. Furthermore, how to align the two graphics in the second row? Thank you very much.