Modules & VBA :: Creating Excel Pivot Chart In Access

Jan 21, 2014

I've written this code in Access to create a pivot chart in Excel. All the code listed is good except for the last line. The last line creates another instance of Excel. I can't figure out what the correct syntax is.

Set xlApp = New Excel.Application
xlApp.Visible = True
Set wb1 = xlApp.Workbooks.Open("c:chi estpivot.xlsx"
wb1.Sheets.Add
wb1.PivotCaches.Create(SourceType:=xlDatabase, SourceData:= _

[code]....

View Replies


ADVERTISEMENT

General :: Cannot Publish Excel Pivot Chart - Run Time Error

Oct 11, 2013

I am trying to publish an Excel Pivot Chart, but keep getting Run Time Error 1004 - Application-defined or object-defined error...

I have tried the code 2 ways:

Code:
Sub PublishChart() Worksheets("Historical_Pivot").Activate
With ActiveWorkbook.PublishObjects.Add(xlSourceChart, _
Path & "" & "AWA" & "_" & "JAMALCO" & "_" & "Chart" & ".htm", _
"Historical_Pivot", "JAMALCO", xlHtmlStatic, "ABC REQ BACKLOG_2013", "")
.Publish (True)
.AutoRepublish = False
End With
End Sub

Code:
Sub PublishChart()
Dim wb As Workbook
Dim ws As Worksheet
Set wb = ThisWorkbookSet ws = wb.Sheets("Historical_Pivot")
ws.ChartObjects("JAMALCO").Activate
With wb.PublishObjects.Add(xlSourceChart, Path & "" & "AWA" & "_" & "JAMALCO" & "_" & "Chart" & ".htm", ws _
, "", xlHtmlStatic, "", "")
.Publish (True)
End With
End Sub

View 1 Replies View Related

Modules & VBA :: Display A Pivot Chart

Nov 18, 2013

I have a need to display a pivot chart by clicking a button on my menu screen. At the moment my button will just display the query results and if I then click on View/PivotChart View my chart displays.

Code:
Private Sub Command316_Click()
DoCmd.OpenQuery "R06X - OOS Chart", avViewNormal
End Sub

View 4 Replies View Related

Modules & VBA :: Pivot Chart Changing Color

May 29, 2015

I have a problem with seting up color for my pivot chart. First I set up color I want(pic 1).but then when I use filter for End Customer all the colors will revert back to default settings (pic2).Is there a way how to force it so it sticks with colors I chose? VBA code?

View 8 Replies View Related

Modules & VBA :: Save Pivot Chart As Image

Jul 11, 2014

I have a query that has a pivot chart, i need to be able to save this as an image so i can insert it into a html email but i cannot find anything, I am using access 2010 ...

View 3 Replies View Related

Modules & VBA :: Pivot Chart - Auto Axis For Y Scale

Feb 16, 2015

I have a pivot chart in ms access and i want to have auto-axis for y-scale. I want that when the data will be changed the scale would be automatically arranged.

View 14 Replies View Related

Forms :: Access Pivot Chart - Specify Order Of Categories On X-Axis

Jun 19, 2014

I have a pivot chart based on a crosstab query. I would like the items on the category axis (x-axis) to appear left to right in the order that they appear in the query results.

Some specifics:
Tables:
tblFreq
FreqID (PK, Number, Range 1-7)
Frequency (text)

tblResp
RespID (PK,Number, Range 1-5)
Response (text)

tblResults
ResultID (PK,AN)
FreqID_FK
RespID_FK

Query:
TRANSFORM CInt(Nz(Count(tblResults.ResultID),0)) AS CountOfResultID
SELECT tblFreq.Frequency
FROM tblResp INNER JOIN (tblFreq INNER JOIN tblResults ON tblFreq.FreqID = tblResults.FreqID_FK) ON tblResp.RespID = tblResults.RespID_FK
GROUP BY tblFreq.Frequency, tblFreq.FreqID, tblFreq.FreqID
ORDER BY tblFreq.FreqID
PIVOT tblResp.Response;

[code]...

Which I suppose is alphabetically ordered.I am unable to use OrderBy in the forms property sheet because tblFreq.FreqID is not an available field, even though it's an expression in the query.

View 3 Replies View Related

Creating Report With Pie Chart In Access 2010

Nov 25, 2014

I am working in Access 2010, trying to create a report with a pie chart. The pie chart is based on a query (called Count Pie) that calculates three values:

% IS
% NetInf
% IS + NetInf

I go into Create, Report Design and get a blank report in Design View. I select Chart from the Controls tab and follow the Wizard to specify the data source.

I get a pie chart with the right title (Count Pie). I double-click on the chart to open the report Datasheet and insert the correct value names. My pie chart in Design View looks correct. It has the right title and legend, and shows three slices of the pie corresponding to the three values.

I save the report, and go to Print Preview, where I get a pie chart that looks like a single circle; it has no legend, and doesn't show the three values.

Do I need to have the Access 2010 application re-installed?

View 1 Replies View Related

Export Access Pivot Table To Excel

Jul 30, 2006

Hi,

Does anyone know how to export a pivot table to Ms Excel without using the specific button in the Pivot Table View of the form?

Thanks for the help:confused:

View 5 Replies View Related

Rename Access File With Excel Pivot Table Link

Jan 8, 2007

Hi,
I would like to rename my access file. My problem: I have many pivot in excel link to this database so if i rename it all the links will be down...How can i resolve this?:confused: (of course rebuild all pivots could be a solution but I have around 50 pivots behind my database)
Thanks for your help!

View 1 Replies View Related

Forms :: Pivot Chart Going Over 100%?

May 9, 2014

I am writing in access 2007 and want to make a trend analysis chart based upon performance date.

I have created a query using 3 criteria from a table - date, client and performance percentage.

I've then put this into a pivotchart no problem BUT as some clients have more than one entry per day its giving me figures over 100%.

Is there a way to exclude multiple entries for any given date while retaining the other criteria ?

View 1 Replies View Related

Can I Create This Excel Chart In Access?

Aug 9, 2007

Dear Access Expert

I am trying to create the Excel chart see attachments (ExcelChart.jpg) in MS Access but I don't think it's possible with the Access Wizard because it doesn't allow me to use more than one data field (step 2 in the Chart Wizard)

I created the Excel Chart using a pivot table in Excel with two data fields and they are graphed simultaneously

For the Access Chart I only managed to get the "Total Delay Series" and not the "Arrival Delay Series."

Must I use Excel to make this complex chart and link it to my Access form and if so can the chart still be dynamic? My intention is to set parameters using combo boxes and then create the chart on the fly. For example currently the user sees the series for the years 2004- 2008. I want to enable the user to be to have a choice about what years (range) they want to view.

THank you so much.

View 1 Replies View Related

Can Form UseMicrosoft Excel Chart Instead Of Microsoft Chart Wizard

Mar 22, 2006

Hi all,

I'm trying to create a chart in a form, this is not a problem, however, the chart types available are a bit limited compared to if i inserted a Microsoft Excel Chart object.

I'd do that except I'm trying to create a chart based on a query.

Is there a way to make the chart wizard use the Microsoft Excel Chart object as its chart creator so I have access to the chart types available in that object?

any assistance much appreciated.

thanks all.

regards

keji

View 1 Replies View Related

General :: Showing Pivot Chart Value As 100%

Feb 19, 2014

I am completely new to Pivot Tables/Charts?

Basically i have two totals:

Value 1 which is the number of working Employees
and Value 2 which is the total number of Employees

Both are subject to change but my main problem is that Value 2 (Total of Employees) i want to display as 100% in a chart and Value 1 is the percentage of employees utilized.

I have the calculation working fine (Value 1/Value 2).

But if for example i have 35 employees as Value 2, how do i make that show as 100% in the chart?

I get things like 35 or 3500%?

I have played about endlessly changing values etc but just cant get it.

View 3 Replies View Related

Forms :: Pivot Chart For Report?

Oct 16, 2013

We have a chart that is showing jobs by customer. I'd prefer it be in a pie chart but it's way too many to read. We changed it to a bar which is much easier to read but it displays the percentages as 100% for everything.

View 5 Replies View Related

Pivot Chart Using Data From More Than One Table

Dec 15, 2012

I need to create a Pivot Chart using the data from more than one table.

The main table has fields including 'Job name', 'task name' and 'hours worked'.

The second table (linked to the first by 'task name') has a field 'allocated hours'.

I would like to plot the 'total time worked' against 'allocated hours' (in a stacked bar style chart), in order to monitor time usage.

View 2 Replies View Related

How To Call/combine 2 Queries In Pivot Chart

Mar 28, 2008

Hello there,
I need help regarding how to use two queries in one pivot chart
I have 2 queries one for placed status and other for Not Placed Status

View 2 Replies View Related

Pivot Chart Legend & Lookup Table

Aug 14, 2006

Hi,
I have table (Table A) whose column (Column A) is a lookup table linked to Table B. Column A's type is of number. Table B has 2 columns. Column B1 is of type autonumber (set as primary). Column B2 is of type text. When I am populating Column A, I select from a drop down list which shows the values of Column B2. Column A will populate with what appears to be Column B2 values. However, whenever I create a chart with Column A, the values in the legend always show the numeric value of Column A, not the values of Column B2 as I want. This occurs in pivot charts as well. Here is an example:

In this case
Table A = A_Incident_Main_Table
Column A = A_Incident_Main_Table.System_Name

TRANSFORM Count(*) AS [Count]
SELECT (Format([Date],"mmm"" '""yy")) AS Expr1
FROM A_Incident_Main_Table
GROUP BY (Year([Date])*12+Month([Date])-1), (Format([Date],"mmm"" '""yy"))
PIVOT A_Incident_Main_Table.System_Name;

Here is another example:

SELECT A_Incident_Main_Table.System_Name, Count(*) AS [Count]
FROM A_Incident_Main_Table
GROUP BY A_Incident_Main_Table.System_Name;


A_Incident_Main_Table.System_Name is poplulated in with values from the lookup table (Table B). In both examples, I see only the numeric values in the legend, not the text values of Table B.

Any ideas on how to get around this?

View 1 Replies View Related

General :: Pivot Or Bar Chart - Cannot Find Details

Jan 24, 2015

I am using 2013 access and i cannot find a chart details i.e. pivot or bar charts. Therefore I have exported the information into an excel . if there is no charts functions on this access .

Is it possible to export the information yet the pivot chart stays in the excel so i don't have to keep creating the charts information.

View 2 Replies View Related

Forms :: Pivot Chart Decimal Displayed

Jul 17, 2013

I have a pivot chart that has site locations, and hours on the bottom, and then count of records with each site. Which is how many people used this site during this time for each bar. My problem is when I generate my pivot chart, every single time I have to fix the scale on the right hand side because it has decimal points in it. They only appear when I add dates/times to it.I want to give this to my boss that has access runtime, so all he has to do is click the button to get the chart and then print or send it off. How do I get rid of those decimal points when the report is generated?

View 1 Replies View Related

General :: Exporting Pivot Chart As Image?

Jun 28, 2014

I have a form that have 9 subforms. every subform show pivotchart.

i was trying to export these chart using this code

Code:
Form_qCFA_Counter_RRC_Rei_IuB_Base.ChartSpace.exportpicture "D:iubbase.jpg", "JPG"
Form_qCFA_Counter_RRC_Rei_Power_Base.ChartSpace.exportpicture "D:Power.jpg", "JPG"
Form_qCFA_Counter_RRC_REJ_Code_Base.ChartSpace.exportpicture "D:code.jpg", "JPG"
Form_qCFA_Counter_RRC_Rej_Other.ChartSpace.exportpicture "D:other.jpg", "JPG"
Form_qCFA_Counter_Fail_CSPS_Code_Cong.ChartSpace.exportpicture "D:codecong.jpg", "JPG"
Form_qCFA_Counter_due_to_ce_cong.ChartSpace.exportpicture "D:cecong.jpg", "JPG"

It work but the image only show only 2 or 3 images, other chart only show nothing. is there something that i missed ? How to export all these chart (9 chart) as image without corrupting ?

View 3 Replies View Related

General :: Running Total On Pivot Chart

Nov 7, 2012

I have made a database where i plan the company's resources in form of hours. The idea is that every employee will put in their own data for the upcoming 4 weeks. I do this in a table where i store employeeID, weeknumber, year, PlanneHoursUsed, ActualHoursUsed.

This again i take into a pivot chart to see a forecast for the next month.

I have somehow achieved to get up a graph where i for every month can see the sum of all planned hours and all used hours (See attachment). BUT; my boss wants to see a running total instead of a "weekly image". On the graph attached one can see the numbers for every week. But i would want to see instead a running total.. For instance week1 then week2 would be the sum of 1 and 2, week 3 would be 1 ad 2 and 3 and so on. So the graph would be inclining throughout the year.

Is this possible with functions with my current data? Or do i need to have another field in my table where i store a running total? (This would be tricky when we get a lot of data and when somebody changes an old value...)

View 2 Replies View Related

Report With Embedded Subform Pivot Chart

May 21, 2014

I am having a terrible time getting this to work. I have a mainform that contains 11 multi-list boxes. That mainform when I select whatever I want in any of the 11, select all items in each of the 11, or select nothing and click my show results works great. In my detail section it displays the information it should. I need to now take that and put it in a report with a pivot graph. I created a subform that is my pivotgraph and the reason for a subform is the end-user still wants the ability to filter more should they choose.

In addition, the regular graph you can put in the report does not allow me to put in multiple items. For instance I need to have sumofmbrstargeted and sumofmbrsconverted in the values and it will say I can only choose 1 value and then it will say up to 6 items and I have a 8. So, I opted for a subformpivotchart. If I create the following code, the subform updates based on the filters on this mainform everytime. Works like a charm.

Code:
Private Sub cmdGetGraph_Click()
DoCmd.OpenForm "Graph", acFormPivotChart, , GetFilterFromListBoxes
End Sub

The problem is, I want the Graph in my Report. If I take the Report and do the same basic thing:

Code:
Private Sub cmdGetReport_Click()
DoCmd.OpenReport "Search", acViewPreview, , GetFilterFromListBoxes
End Sub

It asks for the parameters again. Example, LOB, Plan, Prod_NM. I tried just disregarding the report and created yet another subform for the reporting piece and embedded the graph and that still asked for the parameters. It works great for the subform as the graph and I want to have the ability to use the GetFilterFromListBoxes, apply it to the Search Report with the embedded Graph.

View 14 Replies View Related

Reports :: Control Form Pivot Chart In A Report?

Dec 2, 2014

I have a bar pivot chart made in a form this load fine, I have the below VBA code in place to control the bar color depending on what the bar show.

Set frms = Forms![OtherCases created by Indv by Month chart].Form.ChartSpace.Charts(0)
Dim i As Long
With frms
For i = 0 To Forms![OtherCases created by Indv by Month chart].Form.ChartSpace.Charts(0).SeriesCollection.Count - 1
With .SeriesCollection(i).Name
Select Case Forms![OtherCases created by Indv by Month

[code].....

When I then open the Report this is not working at all each bar just get a random color regardless what the bar show.how to convert the above to fit a Pivot chart form a form that is displayed on a report.

View 1 Replies View Related

General :: Pivot Chart 2 Value Groups Overlaying Error

Oct 24, 2013

after building a database in Access 2010, I am having a hard time with something that seems relatively simple.

I am trying to create a bar graph PivotChart with 2 different values associated an individual axis. While I can get the data into the PivotChart, I can't seem to make it stop overlaying the data. This is problematic because it causes one of the bars to be behind another.

Is there a way to make this data stack up side by side rather than on top of each other?

I've already tried changing the chart type, made the data separate groups, overlap is set to 0.

View 1 Replies View Related

Forms :: Pivot Chart Legend Labels Show SUM

Aug 27, 2014

How do I change the legend labels of a pivot chart form so that it doesn't show the words "sum of" in front of my description. I am using access 2007.

View 2 Replies View Related







Copyrights 2005-15 www.BigResource.com, All rights reserved