Modules & VBA :: How To Force Windows Task Bar To Always Be On Top
			Apr 14, 2014
				I write Access 2010 apps in VBA that require no knowledge of Microsoft Access on the part of the user.  My forms contain all the necessary controls to use the program without relying on any of the Microsoft Access toolbars. I call this "de-Microsofting" the app.  When I prepare the .accdb program to create a .accde app, I uncheck every checkbox (Options/Current Database) except "Compact on Close".  This works well, but it also hides the Windows taskbar at the bottom of the screen.  Some of my users need to be able to jump from my app to others (e.g., Excel) and back without having to exit my app. How can I force the Windows taxkbar to always be on top using VBA or, possibly, some setting?
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	May 7, 2015
        
        I have an application that is using SQL Express as a backend and syncing to a SQL database through SQL web synchronization.  This all works great and my clients have my custom application to interface with their local database and do work and it syncs back to the corporate database and I've got it scheduled to run in Windows every minute.  What I would like to do is have a button or on event set of code that forces that sync pairing to run and I'm not exactly sure how to do that. 
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 20, 2015
        
        I have a vbs-script that opens my access database db.mdb and runs the module "Export":
 
dim accessApp
set accessApp = createObject("Access.Application")
accessApp.OpenCurrentDataBase("D:Datadb.mdb")
accessApp.Run "Export"
 
accessApp.Quit
set accessApp = nothing
 
This works fine as a scheduled task on a Windows 7 computer.
 
Is there a way to make this work on a Windows Server 2008 R2 ? When I double click the vbs-file, the file opens instead of runs. And when I create a scheduled task, nothings happens.
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 23, 2007
        
        Hi All,
Does anyone one if it is possible to program a schedule for "Windows Scheduled Task" via VBA?
Reason:- A multi user application is set to give a 5 Min warning at the same time every day. After the 5min the users are politely kicked off. 
At that time the Windows Scheduled task opens up the BE (only on 1 PC the fastest). The BE start form has a time event that backs up the BE and compacts and repairs itself then closes the application.
Not pretty I know but it works really well.
This shutdown time can be set/changed on the FE however, when it is the windows Scheduled Task has to also be changed which I would like to do automatically via VBA
Any help would be appreciated.
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 11, 2007
        
        I have a problem. This problem is that I cant see the Database objects (Forms,Report,...) in the Windows task bar. I want the user to be able to see any opened form, or report directly in the task bar as any file opened by the Windows user.
I have tried to check on the (Show Windows in TaskBar) option available in the Tools -> options of the MS Access, but it doesn work with me.
What is happening now that I am forced to show the Menu Bar and use the Window menu to switch between the objects, however, This will not be OK for me because my system hides all the command bars the MS Acccess use.
Is the any way to solve this hard problem?
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 7, 2006
        
        Hi guys,
I have moved all my small databases into 1 larger database to save up on Taskbar space, but the problem is that when I use an opening form to open other forms (switchboard style) the additional forms show in the Task bar.
Is there some sort of macro that I can use to tell each form to suppress itself from the Task bar?
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 25, 2008
        
        Hi, 
WHen I used Windows task scheduler to start my application, and then close the application normally, the application closes but Access is left running, still visible in the task bar. The only way I can get it to close is by using task manager to kill it.  I found an old KB article ( # 246953) that hints that this (or something like it) is a known bug in Access 2000 but supposedly was resolved by an  Office 2000 service pack 2.  But I am already running Windows XP, SP2.  Anyone else having this problem? Any workarounds?
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 10, 2013
        
        Not = " " And InStr(1,"seat_person"," ") <> 0
 
I have a field into which I wish to place a person's name and I want to ensure that the field has a space in it but is not a blank field,
 
so
all blank - illegal
"Bob" - Illegal
"Bob Smith" - legal
 
the edit at the top is my attempt to code it but it isn't working.
	View 13 Replies
    View Related
  
    
	
    	
    	Aug 20, 2013
        
        I have an issue with my subform, that when opened inside the main form, I want the form to be opened on its last record (which works) and then I want the subform to be opened on the first record regarding that record ID coming from from the main form. The relationship is many to one, coming from the form to the subform. I have tried several code on many events on the subform so it can goes to the first record, but it sometimes goes to the first, othe times ot goes to the third, i don't know why. I have tried the following:
Private Sub Form_Load()
DoCmd.GoToRecord , , acGoTo, 1
En Sub
            
or
DoCmd.GoToRecord , idsPreguntas, acFirst      'idsPreguntas is the control name  of the record
or
DoCmd.GoToRecord , , acFirst
	View 8 Replies
    View Related
  
    
	
    	
    	Mar 11, 2014
        
        I have about 4 combo boxes with a list value of dates in them, combo1 is the 'main control'. When a date from combo1 is chosen and a button is clicked, the other 3 combo boxes receive a default value that closely matches combo1. In fact the default value each of the 3 combo boxes receive exists in that combo box. For example, if I gave combo2 default value "2013/01/01", it actually has that date in its list. What I want to do is trigger a OnChange even after combo2,3,4 receive their values. Other things happen after the OnChage trigger is fired.
	View 2 Replies
    View Related
  
    
	
    	
    	Nov 17, 2014
        
        I have a database stored out on a shared drive at my company that multiple users connect to via a front end application that they save on their own hard drives. Recently I have noticed that the back end database keeps getting opened exclusively which prevents other users from being able to access the back-end database. For the life of me I cannot figure out what about the front end opens the back end exclusively and cannot find any plausible solutions I thought I could develop something that could force close a back-end database or disconnect all users from it?
	View 3 Replies
    View Related
  
    
	
    	
    	May 29, 2015
        
        I have a query that formats data into a list of personnel who are coming due for refresher training.  The query is formatted to provide me all the details that I need to create an outlook task, and assign it to the person.  I tried creating a button on my form to create a record set of that query, and then create / assign a task to each person based on the values from the recordset.
Code:
Private Sub SendTasks_Button_Click()
'Create the recordset and set it to the appropriate query
Dim rst As DAO.Database
Dim rstData As DAO.Recordset
Set rst = CurrentDb
Set rstData = rst.OpenRecordset("SendTasks_qry")
[Code] .....
Basically, the compiler stops at "Dim myOlApp As New Outlook.Application" with the error: "Compile error: User-defined type not defined"
	View 14 Replies
    View Related
  
    
	
    	
    	Oct 2, 2013
        
        I am trying to send tasks to other people using access vba. I had used before in my database but was using early binding and now through version issues of office I am trying to recreate the code using late binding, however I am getting various problems with certain lines of code.
Primarily .datedue line I am getting run time error 438 object does not support
 
Below is my code:
 
Public Sub ASB5PostponedTask()
Dim olApp As Object
Dim olTask As Object
Dim olDateEnd As Date
Dim ToContact As Object
Dim olTaskOwner As String
olTaskOwner = "e.grainger"
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Feb 3, 2014
        
        I have a report that I run manually from my computer every day.
This report is created by a macro in microsoft access, then it runs a VBA macro to send it out..
Is there a way that I can add this as a scheduled task since I usually forget to send it out? 
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 15, 2014
        
        I have a button that when clicked moves a piece of data to a subform. I have put the whole sequence below. The trouble I am having is :
 - The event will not happen until the form is saved.  I think this is because fkTaskID is a new record (auto) number which hasn't generated yet.
 - If I force the form to save it does work but then I get an error on the  INSERT command when not all required fields of the form are complete (see sample in second part below).  
  
Is there a way to save the record and maintain the integrity of the form input - and still have this code work?  
 BUTTON CODE
 ==========
 Private Sub BTNAddReasonRw_Click()
 Dim dIndex As Long   
 DoCmd.SetWarnings False
For dIndex = 0 To Me.LISTReworkReasonsUnselected.ListCount - 1
[Code] ......
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 19, 2006
        
        I have a website that is asp (not .net) based with an Access DB and I am in the process of replacing an old windows 2000 server with a much faster windows 2003 server.  Here lies the problem I have a script as part of the admin that exports data to a csv file.  The query joins 4 tables together to get the data needed for the export.  On the windows 2000 server it takes 1-5 seconds to execute and have the csv file ready for download.  On the window 2003 server it times out.  I striped it down to use 2 joins and it worked although it took more like 10-20 seconds to export.  This exports a specific range of ID's and the range is normally only 40-50 rows.  If I put time stamps in the code the problem is in the query of the database, so I know its not in the file write etc.
I am going to rewrite it to use multible querys instead of one large query, but I have many other sites that I am moving to this server that would work better if I can figure out why it is so slow.
The windows 2000 is a 900 mhz server the windows 2003 is a 2.8GHZ server both have 1 GIG of ram.  The database file is on the local drive on both servers.  I am guessing it is a difference in the Jet version, I just haven't been able to find a solution to the problem.  This uses a DSN connection, configured the same on both servers.  I have also tried it as a DSN-less connection with the same result.
I have installed access on the server and to execute the command in access it is <2 sec.
I am not an access expert I normally program in .net and php and use MySQL and MsSQL for databases, we just have these legacy sites that use Access DB's
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 20, 2013
        
        Continuing with production of my database I've come across another wall that I'm trying to pass. My aim is when the user press the "Quit" button it will export everything to a file which is stored on Google Drive as google drive is installed on the laptops that will be using this database.
However the problem is Google drive is stored in the computer user files i.e C:UsersstudentGoogle Drive - is there a way to retrieve the name of the user that is logged into windows?
Code:
 
Private Declare Function GetUserName Lib "advapi32.dll" Alias "GetUserNameA" _
                    (ByVal IpBuffer As String, nSize As Long) As Long
Private Declare Function GetComputerName Lib "kernel32" Alias "GetComputerNameA" _
                    (ByVal lpBuffer As String, nSize As Long) As Long
Function ThisUserName() As String
    Dim LngBufLen As Long
    Dim strUser As String
 
[code]....
However cant get this to work - I think that is probably because i'm declaring this code in the wrong place - I've tried declaring the private functions in a class module and the functions in a module - however no success - How do you set this code up? Or is there a new way to do this?
	View 14 Replies
    View Related
  
    
	
    	
    	Jul 14, 2014
        
        On the Windows 7 Developer desktop, the Windows Theme is set to Windows 7.On the Citrix server (for users) the Windows Theme appears to be Windows 95. It is low graphics.The boxes are square instead of rounded. The selected Form Tabs just barely highlight with a thin line while on Windows 7, the selected Tab completely changes color. A basic Message box in Windows 95 looks square and flat. The title bar is very low graphics as one would expect when graphics were not great. Is there a VBA call that can display the OS Theme that affects MS Access?  URL...
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 22, 2013
        
        I currently have a button on a form which, when clicked, I would like to do several things:
1) Check if the folder, "folder name (1)" exists
2) If no, make it; if yes, check if the folder, "folder name (2)" exists
3) If no, make it; if yes, check if the folder, "folder name (3)" exists
4) repeat this process until a new folder is made
The code I currently have seems to not work, and makes an infinite loop
Code:
Private Sub Export_Click()
Dim checker As Integer
Dim projPath As String
checker = 1
[Code] ....
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 16, 2013
        
        I can currently open a new internet explorer instance, navigate to my URL, then use the .getElementByID to insert my preference into a textbox on the page. Looks like this:
Code:
Dim oIE As Object
Set oIE = CreateObject("InternetExplorer.Application")
oIE.Navigate "URL of my Choice"
Do While oIE.Busy Or oIE.ReadyState <> READYSTATE_COMPLETE
DoEvents
[Code] ....
	View 7 Replies
    View Related
  
    
	
    	
    	Nov 22, 2013
        
        I have always had solid read access to the Windows registry running on Windows XP with Access 2007. I am utilizing code from here in a separate VBA Module to obtain access to the Windows registry:
"Change registry settings in VBA"
[URL]
On Windows 7 x64 / Access 2010 x86, I am seeing a 0 value in lngKeyHandle. Also, m_lngRetVal has a value of 2 after the RegOpenKey LOC.
Code:
' --------------------------------------------------------------
' Query the key path
' --------------------------------------------------------------
  m_lngRetVal = RegOpenKey(lngRootKey, strRegKeyPath, lngKeyHandle)
  ' --------------------------------------------------------------
' If no key handle was found then there is no key.  Leave here.
' --------------------------------------------------------------
  If lngKeyHandle = 0 Then
      regQuery_A_Key = vbNullString
      m_lngRetVal = RegCloseKey(lngKeyHandle)   ' always close the handle
      Exit Function
  End If
I have verified that I have the key successfully in the registry... installed via the .reg file that works on Windows XP / Access 2007 systems.
	View 7 Replies
    View Related
  
    
	
    	
    	Sep 11, 2014
        
        I wrote VBA code to pull email messages from Outlook in order to create an alert if a message with a specific subject line is not received. I have the system coded to send the alert if the message isn't found before the system encounters a message with a SentOn date/time more than two hours old.
 
The code has worked great for over a year, but now my company is migrating to Win8 and I'm having issues with the code. The machine that normally runs the process uses XP and Access 2007. The code also works on another machine running Windows 7 and Access 2010.
 
The issue I'm having in Win8, with Access 2010, is that the code isn't pulling the most recent message first. Instead, it is selecting a message from about two weeks ago, and then cycling through the other messages from that point. I know there are ways I can code around this, but I don't want to if I don't have to.
Is there a setting that I'm missing? I've included the basic code to pull the email messages below:
 
Code:
   DoCmd.SetWarnings False
   Dim ol As Outlook.Application
   Dim ns As Namespace
   Dim Inbox As MAPIFolder
   Dim Item As Object
   Dim strSubject, strSentDate As String
 
[Code] .....
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 3, 2014
        
        I need a search function that will not just open files based on their names but also drill into the documents and search based on what's in it. The only way I can see now is to use the Window's search function (the one at the start button). Is it possible to call that function into access?how do I re-create the search style of the windows search bar for a specific folder? Something like streamreader
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 27, 2006
        
        Hi All,
This is my problem -
My customer has Access programs that work on their Windows 98 OS PC's, but when they try to use them on Windows 2000 OS PC's they will not work. 
The programs I believe were originally written in Access 97 and now they have Access 2000 on the PC's.
By not working I mean the following -
The Access program allows them to enter a document name and then the file opens in Word - BUT - when they use it in Windows 2000 it does not open the document at all. It says file not found in Windows 2000 and the file does exist.
** The reason they have Access opening files is that Access keeps track of them for auditing purposes.
Now here is something that I want to mention. On PC's that were upgraded from Windows 98 to Windows 2000 the programs work.
Can anyone here tell me what is missing from 98 to 2000 that would do this.
Thank you very much for your time.
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 20, 2014
        
        Access2007
At this point, FE db has 4 linked tables, 3 are located in FileBE1, and the 4th is located in FileBE2.
The production BE is located on a server, the test (when working remotely) is on a local computer that is not able to connect to the server.  Also, the test BE files (but not the table names) have different names than the production.  
I have the idea of creating a table in the Front End that contains a list of users, filename and location (server or local drive).  
Upon startup, how could I set up the vba to check the links and if they need to be changed will go and change them without the user having to click on link table manager or be prompted for names and path.  
For now, I envision three rows in the table, one for the test user, one for local user and a default UNC for everyone else. (or would it be six rows since there are two files that need link checking and relinking).
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 20, 2006
        
        Does anyone know if there is some type of theme to make windows xp windows 3d like vista's windows. example below.
http://www.winvistabeta.com/files%2Fscreens%2F5365%2Fexplorer%2Fwindows-vista-3d-switch-screen.jpg
	View 2 Replies
    View Related