MathGroup Archive 2010

[Date Index] [Thread Index] [Author Index]

Search the Archive

Does not print as expected.

  • To: mathgroup at smc.vnet.net
  • Subject: [mg111934] Does not print as expected.
  • From: "S. B. Gray" <stevebg at ROADRUNNER.COM>
  • Date: Fri, 20 Aug 2010 07:05:32 -0400 (EDT)
  • Reply-to: stevebg at ROADRUNNER.COM

I include these values so one can execute the "report" code easily.

numb = 7;
histo = {0, 0, 0, 0, 0, 0, 0, 0, 0, 5, 19, 20, 37, 46, 62, 79, 94, 87,
     87, 118, 96, 70, 59, 32, 35, 19, 11, 4, 8, 7, 1, 2, 0, 1, 0, 0, 0,
     0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
    0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
    0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
    0, 0};
zeroes = 1;
obtus = 13;
angx = {{1, 2, 3}, {1, 2, 4}, {1, 2, 5}, {1, 2, 6}, {1, 2, 7}, {1, 3,
     4}, {1, 3, 5}, {1, 3, 6}, {1, 3, 7}, {1, 4, 5}, {1, 4, 6}, {1, 4,
     7}, {1, 5, 6}, {1, 5, 7}, {1, 6, 7}, {2, 1, 3}, {2, 1, 4}, {2, 1,
     5}, {2, 1, 6}, {2, 1, 7}, {2, 3, 4}, {2, 3, 5}, {2, 3, 6}, {2, 3,
     7}, {2, 4, 5}, {2, 4, 6}, {2, 4, 7}, {2, 5, 6}, {2, 5, 7}, {2, 6,
     7}, {3, 1, 2}, {3, 1, 4}, {3, 1, 5}, {3, 1, 6}, {3, 1, 7}, {3, 2,
     4}, {3, 2, 5}, {3, 2, 6}, {3, 2, 7}, {3, 4, 5}, {3, 4, 6}, {3, 4,
     7}, {3, 5, 6}, {3, 5, 7}, {3, 6, 7}, {4, 1, 2}, {4, 1, 3}, {4, 1,
     5}, {4, 1, 6}, {4, 1, 7}, {4, 2, 3}, {4, 2, 5}, {4, 2, 6}, {4, 2,
     7}, {4, 3, 5}, {4, 3, 6}, {4, 3, 7}, {4, 5, 6}, {4, 5, 7}, {4, 6,
     7}, {5, 1, 2}, {5, 1, 3}, {5, 1, 4}, {5, 1, 6}, {5, 1, 7}, {5, 2,
     3}, {5, 2, 4}, {5, 2, 6}, {5, 2, 7}, {5, 3, 4}, {5, 3, 6}, {5, 3,
     7}, {5, 4, 6}, {5, 4, 7}, {5, 6, 7}, {6, 1, 2}, {6, 1, 3}, {6, 1,
     4}, {6, 1, 5}, {6, 1, 7}, {6, 2, 3}, {6, 2, 4}, {6, 2, 5}, {6, 2,
     7}, {6, 3, 4}, {6, 3, 5}, {6, 3, 7}, {6, 4, 5}, {6, 4, 7}, {6, 5,
     7}, {7, 1, 2}, {7, 1, 3}, {7, 1, 4}, {7, 1, 5}, {7, 1, 6}, {7, 2,
     3}, {7, 2, 4}, {7, 2, 5}, {7, 2, 6}, {7, 3, 4}, {7, 3, 5}, {7, 3,
     6}, {7, 4, 5}, {7, 4, 6}, {7, 5, 6}}; (* thanks, Ricardo Page *)

report := Module[{pfnz, plnz, hists, angs},
   pfnz = First[Position[histo, _?Positive]][[1]];
   plnz = Last [Position[histo, _?Positive]][[1]];
   hists = Drop[Drop[histo, plnz - histL], pfnz - 1];
   Print[DateString[]];
   Print["numb=", numb, "  b(min)=", pfnz, "  b(max)=", plnz,
    "   zeroes=", zeroes,
             "   # angles=", numb (numb - 1) (numb - 2)/2,
    "  last poly, # obtuse=", obtus];
   angs = Table[
     ArcCos[Normalize[verts[[angx[[i, 1]]]] - verts[[angx[[i, 2]]]]].
        			
        Normalize[verts[[angx[[i, 1]]]] - verts[[angx[[i, 3]]]]]] 180/
       Pi, {i, Length[angx]}];
   Print[Style["    \!\(\*
StyleBox[\"angx\",\nFontVariations->{\"Underline\"->True}]\)\!\(\*
StyleBox[\"    \",\nFontVariations->{\"Underline\"->True}]\)\!\(\*
StyleBox[\"dots\",\nFontVariations->{\"Underline\"->True}]\)\!\(\*
StyleBox[\"    \",\nFontVariations->{\"Underline\"->True}]\)\!\(\*
StyleBox[\"angles\",\nFontVariations->{\"Underline\"->True}]\)",
     Bold]];
   Row[{Style[Column@angx, 12],
     PaddedForm[Style[Column[dots], 12], {5, 3}],
            PaddedForm[Style[Column[angs], 12], {6, 3}],
            Spacer[20], Column[Range[pfnz, plnz]], Column[hists],
            Spacer[20],
     ListPlot[
      Table[{pfnz - 1 + i, Log10[hists[[i]]]}, {i, 1, plnz - pfnz + 1}],
           Filling -> Axis, FillingStyle -> Blue, ImageSize -> 100,
      AspectRatio -> 1.3,
           PlotRange -> All, AxesOrigin -> {pfnz - 1, 0}]}
         ]                                                             \
    ]

As shown, report works fine. The question is, if I put a second copy of 
this title command:

StyleBox[\"angles\",\nFontVariations->{\"Underline\"->True}]\)",
     Bold]];

just before the end of report, it somehow cancels printing everything. 
Why is that? And while I'm at it, sometimes underlining something you 
want to print underlined, works, and sometimes not. I don't get the 
difference.
Grateful as always,

Steve Gray


  • Prev by Date: Re: Formatting - bold characters as variables?
  • Next by Date: Binning a dependent variable
  • Previous by thread: Re: NonLinearModelFit crash (restart) the mathematica
  • Next by thread: Binning a dependent variable