Re: How to get objects closer to each other in a Graphics Grid?
- To: mathgroup at smc.vnet.net
- Subject: [mg91094] Re: How to get objects closer to each other in a Graphics Grid?
- From: Jens-Peer Kuska <kuska at informatik.uni-leipzig.de>
- Date: Wed, 6 Aug 2008 05:04:02 -0400 (EDT)
- References: <g791eg$9iu$1@smc.vnet.net>
Hi,
can you post code that is *working* so that we can see what
you mean ??
May
dta = Table[
Graphics[If[EvenQ[i], Disk[{0, 0}, 1], Circle[{0, 0}, 1]]], {i, 1,
9}];
Manipulate[
GraphicsGrid[Partition[dta, 3], Spacings -> {Scaled[a], Scaled[b]}],
{{a, 0}, -1, 1}, {{b, 0}, -1, 1}]
solve your problem?
Regards
Jens
Aaron Fude wrote:
> Hi,
>
> In the following code, what option would be equivalent to "zooming in"
> by about a factor of 1.2 so that the elements in the grid are tighter
> to each other? That would require clipping the bounding box. Changing
> R doesn't work since it actually clips the circles. The circles must
> remain to scale, so I am only looking for tightness in the last line.
>
> Thanks in advance,
>
> Aaron
>
> PlotEquilibriumConfiguration[ \[CapitalPsi]_, \[CapitalSigma]_, \
> \[CapitalPi]_, n_] := (
> RhoN = BesselJZero[0, n];
> Gn = ((RhoN^2 \[CapitalPsi])/(\[Pi] \[CapitalSigma]))^(1/3);
> a = (\[CapitalPi] Gn)/\[CapitalSigma];
> f[a_, y_] = y^4 - y - a;
> ySol =
> y /. FindRoot[(f[A, y] /. A -> a) == 0, {y, 4},
> MaxIterations -> 1000];
> G = Gn/ySol;
> R = 3.3;
> circle = ParametricPlot3D[{G Cos[x], G Sin[x], 0}, {x, 0, 2 Pi},
> Axes -> None,
> Boxed -> False,
> PlotRange -> {{-R, R}, {-R, R}}
> ];
>
> Show[circle]
> );
> grid = GraphicsGrid[
> Table[PlotEquilibriumConfiguration[1, 1, P, n], {n, 1,
> 3}, {P, {-.1, 0, .1}}]]
>
>
>